diff --git a/DESCRIPTION b/DESCRIPTION index 064aca0..065fd25 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -31,7 +31,8 @@ Suggests: primarycensored, vdiffr, knitr, - rmarkdown + rmarkdown, + pkgload Config/testthat/edition: 3 Encoding: UTF-8 Roxygen: list(markdown = TRUE) diff --git a/NEWS.md b/NEWS.md index 235fc84..1cdf915 100644 --- a/NEWS.md +++ b/NEWS.md @@ -2,6 +2,7 @@ ## Features * Add day of week effect to simulated timeseries (#91) +* Estimate day-of-week effects as a random effect in the fitted model and correct for them in growth rate estimation (#89) # RtGam v0.2.0 diff --git a/R/RtGam.R b/R/RtGam.R index 85e118d..15dc38c 100644 --- a/R/RtGam.R +++ b/R/RtGam.R @@ -1,3 +1,4 @@ +# nolint start: line_length_linter #' Fit a generalized additive model to incident cases #' #' Incident cases are modeled as a smooth function of time with a generalized @@ -8,10 +9,10 @@ #' #' Incident cases (\eqn{y}) are modeled as smoothly changing over time: #' -#' \deqn{\text{log}\{E(y)\} = \alpha + f_{\text{global}}(t)} +#' \deqn{\text{log}\{E(y)\} = \alpha + f_{\text{global}}(t) + \omega(\text{wday}(t))} #' -#' where incidence is negative-binomially distributed and \eqn{f(t)} is a smooth -#' function of time. +#' where incidence is negative-binomially distributed, \eqn{f(t)} is a smooth +#' function of time, and \eqn{\omega(\text{wday}(t))} is a random day-of-week effect. #' #' @param cases A vector of non-negative incident case counts occurring on an #' associated `reference_date`. Missing values (NAs) are not allowed. @@ -20,6 +21,13 @@ #' once. #' @param group The grouping variable for the case/reference-date pair. Not yet #' implemented and a value other than `NULL` will throw an error. +#' @param day_of_week A boolean or a vector of custom values to be applied to the +#' model as a random effect. If `TRUE`, then `RtGam` will use the parsed +#' `reference_date` values to infer the day of week. If a vector of the same +#' length as `reference_date`, then the user-supplied values are used as the +#' day-of-week effect, overriding the actual day of week. This approach can +#' be used to, for example, adjust for atypical reporting due to a holiday. +#' If `FALSE` no day of week effect is applied. #' @param k An integer, the _total_ dimension of all the smoothing basis #' functions. Defaults to `smooth_dim_heuristic(length(cases))`, which picks a #' reasonable estimate based on the number of provided data points. This total @@ -58,6 +66,12 @@ #' * backend: The user-provided `backend` argument #' * formula: The formula object provided to the model #' * diagnostics: The quantitative diagnostics of the model fit +#' @references +#' Mellor, Jonathon, et al. "An Application of Nowcasting Methods: Cases of +#' Norovirus during the Winter 2023/2024 in England." medRxiv (2024): 2024-07. \cr +#' Ward, Thomas, et al. "Growth, reproduction numbers and factors affecting the +#' spread of SARS-CoV-2 novel variants of concern in the UK from October 2020 +#' to July 2021: a modelling analysis." BMJ open 11.11 (2021): e056636. \cr #' @export #' @examples #' withr::with_seed(12345, { @@ -70,9 +84,11 @@ #' ) #' fit <- RtGam(cases, reference_date) #' fit +# nolint end: line_length_linter RtGam <- function(cases, reference_date, group = NULL, + day_of_week = TRUE, k = smooth_dim_heuristic(length(cases)), m = penalty_dim_heuristic(length(unique(reference_date))), backend = "gam", @@ -82,17 +98,25 @@ RtGam <- function(cases, cases, reference_date, group, + day_of_week, k, m, backend ) - reference_date <- validate(cases, reference_date, group, k, m) + reference_date <- validate(cases, reference_date, group, day_of_week, k, m) - df <- dataset_creator(cases, reference_date, group, backend) + df <- dataset_creator( + cases = cases, + reference_date = reference_date, + group = group, + day_of_week = day_of_week, + backend = backend + ) formula <- formula_creator( k = k, m = m, - is_grouped = !rlang::is_null(group) + is_grouped = !rlang::is_null(group), + day_of_week = df[["day_of_week"]] ) fit <- do.call( @@ -109,6 +133,7 @@ RtGam <- function(cases, fit = fit, df = df, group = group, + day_of_week = day_of_week, k = k, m = m, backend = backend, diff --git a/R/checkers.R b/R/checkers.R index 6f84197..3061ced 100644 --- a/R/checkers.R +++ b/R/checkers.R @@ -30,29 +30,21 @@ check_vector_length <- function( } check_vectors_equal_length <- function( - cases, reference_date, - group, + ..., call = rlang::caller_env()) { - if (rlang::is_null(group)) { - args <- c("cases", "reference_date") - lengths <- c(length(cases), length(reference_date)) - all_equal <- length(cases) == length(reference_date) - } else { - args <- c("cases", "reference_date", "group") - lengths <- c(length(cases), length(reference_date), length(group)) - all_equal <- all( - length(cases) == length(reference_date), - length(cases) == length(group) - ) - } + # Drop NULL elements + raw_args <- list(...) + args <- raw_args[which(sapply(raw_args, \(x) !rlang::is_null(x)))] - if (!all_equal) { + # Check equal length + equal_length <- sapply(args, \(arg) length(arg) == length(reference_date)) + + # Error if not + args <- names(equal_length) + if (!all(equal_length)) { cli::cli_abort( - c( - "{.arg {args}} must be the same length", - "i" = "{.arg {args}} are of lengths {.val {lengths}}" - ), + "{.arg {args}} is not the same length as {.arg reference_date}", class = "RtGam_invalid_input", call = call ) @@ -109,6 +101,7 @@ check_required_inputs_provided <- function( cases, reference_date, group, + day_of_week, k, m, backend, @@ -116,6 +109,7 @@ check_required_inputs_provided <- function( rlang::check_required(cases, "cases", call = call) rlang::check_required(reference_date, "reference_date", call = call) rlang::check_required(group, "group", call = call) + rlang::check_required(day_of_week, "day_of_week", call = call) rlang::check_required(k, "k", call = call) rlang::check_required(m, "m", call = call) diff --git a/R/dataset_creator.R b/R/dataset_creator.R index 52b6048..5328b96 100644 --- a/R/dataset_creator.R +++ b/R/dataset_creator.R @@ -4,7 +4,12 @@ #' @return A dataframe for mgcv #' @export #' @keywords internal -dataset_creator <- function(cases, reference_date, group, backend) { +dataset_creator <- function( + cases, + reference_date, + group, + day_of_week, + backend) { cases_int <- integerify_cases(cases) timestep <- dates_to_timesteps( @@ -21,7 +26,11 @@ dataset_creator <- function(cases, reference_date, group, backend) { cases = cases_int, timestep = timestep, reference_date = reference_date, - group = group + group = group, + day_of_week = set_day_of_week_factor( + day_of_week, + reference_date + ) ) class(dat) <- c(glue::glue("RtGam_{backend}"), class(dat)) @@ -75,3 +84,24 @@ dates_to_timesteps <- function(reference_date, (ref_date_int - min_int) / (max_int - min_int) } + +#' Map user input to model-expected format +#' Downstream the type of the return is used as a sentinel for +#' whether to implement a day of week effect. If a factor, then +#' the day of week effect is added to the model. Otherwise, the +#' day of week effect is excluded. +#' @noRd +set_day_of_week_factor <- function(day_of_week, reference_date) { + if (rlang::is_true(day_of_week)) { + as.factor(format(reference_date, "%A")) + } else if (rlang::is_false(day_of_week)) { + rep(FALSE, length(reference_date)) + } else if (rlang::is_bare_vector(day_of_week)) { + as.factor(day_of_week) + } else { + # This case shouldn't be reachable by the user + cli::cli_abort(c( + "{.arg day_of_week} has an unexpected type. See {.code ?RtGam()}" + )) + } +} diff --git a/R/formula.R b/R/formula.R index b46557b..074c054 100644 --- a/R/formula.R +++ b/R/formula.R @@ -20,7 +20,7 @@ #' @param is_grouped Whether to use a hierarchical model. Not yet supported. #' @return A formula to be used by [`mgcv::gam()`] #' @noRd -formula_creator <- function(k, m, is_grouped) { +formula_creator <- function(k, m, is_grouped, day_of_week) { outcome <- "cases" intercept <- "1" @@ -42,9 +42,15 @@ formula_creator <- function(k, m, is_grouped) { k = {smooth_basis_dim[['global_trend']]}, bs = 'tp')") } - # nolint end - f <- glue::glue("{outcome} ~ {intercept} {plus_global_trend}") + if (is.factor(day_of_week)) { + plus_day_of_week <- "+ s(day_of_week, bs = 're')" + } else { + plus_day_of_week <- "" + } + + f <- glue::glue("{outcome} ~ {intercept} {plus_global_trend} {plus_day_of_week}") + # nolint end stats::as.formula(f) } diff --git a/R/predict.R b/R/predict.R index 5aa3f09..6522f78 100644 --- a/R/predict.R +++ b/R/predict.R @@ -15,6 +15,15 @@ #' @param min_date,max_date Optional. Date-like objects specifying the start #' and end of the prediction range. See **Details** for more information on #' their usage. +#' @param day_of_week How to handle day-of-week effects when predicting +#' `obs_cases`. Defaults to `TRUE`, which identifies and applies the fitted +#' day-of-week effect, if possible. When automatic detection fails or +#' different levels are desirable, custom levels can be applied with a vector +#' of equal length to the number of desired dates. If `FALSE`, the day-of-week +#' effect is turned off (i.e., set to zero). When predicting parameters other +#' than `obs_cases` or `object` is an `RtGam` model that did not include +#' day-of-week effects, the day-of-week effect is turned off and this argument +#' is silently ignored. #' @param n An integer specifying the number of posterior samples to use #' for predictions. Default is 100. #' @param mean_delay Optional. An integer specifying the mean number of days @@ -72,11 +81,12 @@ #' the `gratia` package. The model estimates basis function coefficients on the #' smooth terms \eqn{\hat \beta} and smoothing parameter(s) \eqn{\lambda}. The #' coefficients have the joint posterior distribution -#' \deqn{\beta | \lambda \sim N(\hat \beta, \mathbf{V}_{\hat \beta}} +#' \deqn{\beta | \lambda \sim N(\hat \beta, \mathbf{V}_{\hat \beta})} #' where \eqn{\mathbf{V}_{\hat \beta}} is the smoothing-parameter uncertainty #' corrected covariance matrix of the basis function coefficients. We draw #' samples from \eqn{\mathbf{V}_{\hat \beta}} and multiply them by the dates of -#' interest to generate posterior draws. +#' interest to generate posterior draws. If estimating `"Rt"` or `"r"` +#' the day-of-week effect is excluded (i.e., set to zero). #' #' For the intrinsic growth rate, we draw one day before and one day after every #' day of interest. We difference these two days within the smooth to get growth @@ -93,6 +103,7 @@ #' observation error to the posterior expected incident cases to generate #' posterior predicted incident cases. #' +#' #' @seealso [gratia::fitted_samples()], [gratia::posterior_samples()] #' @references Miller, David L. "Bayesian views of generalized additive #' modelling." arXiv preprint arXiv:1902.01330 (2019). @@ -132,6 +143,7 @@ predict.RtGam <- function( horizon = NULL, min_date = NULL, max_date = NULL, + day_of_week = TRUE, n = 100, mean_delay = NULL, gi_pmf = NULL, @@ -148,6 +160,7 @@ predict.RtGam <- function( horizon = horizon, min_date = min_date, max_date = max_date, + day_of_week = day_of_week, n = n, mean_delay = mean_delay, gi_pmf = gi_pmf, @@ -195,6 +208,7 @@ predict_obs_cases <- function( horizon = NULL, min_date = NULL, max_date = NULL, + day_of_week = TRUE, n = 10, gi_pmf = NULL, seed = 12345, @@ -206,19 +220,32 @@ predict_obs_cases <- function( min_date = min_date, max_date = max_date, horizon = horizon, + day_of_week = day_of_week, call = call ) - # Use `posterior_samples()` over `fitted_samples()` to get response - # w/ obs uncertainty - fitted <- gratia::posterior_samples( - object[["model"]], + args <- list( + model = object[["model"]], data = newdata, - unconditional = TRUE, n = n, seed = seed, + unconditional = TRUE, + newdata.guaranteed = TRUE, ... ) + # Turn off day of week only if requested and also + # was set to on in the model fitting + if ( + is.factor(object[["data"]][["day_of_week"]]) && rlang::is_false(day_of_week) + ) { + args[["exclude"]] <- "s(day_of_week)" + } + fitted <- suppress_factor_warning(do.call( + what = gratia::posterior_samples, + args = args + )) + fitted[".response"] <- as.integer(fitted[[".response"]]) + format_predicted_dataframe(fitted, newdata) } @@ -250,15 +277,23 @@ predict_growth_rate <- function( # transparent. We have 1, 2, 3, ... and map to 1, NA, 2, NA, ... # to show that the timesteps are (t0, t2), (t1, t3), ... newdata[".row"] <- interleave(seq(1, nrow(newdata) / 2, 1), NA) - fitted <- gratia::fitted_samples( - object[["model"]], + args <- list( + model = object[["model"]], data = newdata, n = n, seed = seed, unconditional = TRUE, scale = "linear_predictor", + newdata.guaranteed = TRUE, ... ) + if (is.factor(object[["data"]][["day_of_week"]])) { + args[["exclude"]] <- "s(day_of_week)" + } + fitted <- suppress_factor_warning(do.call( + what = gratia::fitted_samples, + args = args + )) timestep_first_row <- which((fitted[[".row"]] - 1) %% 2 == 0) fitted <- data.frame( .row = (fitted[timestep_first_row, ".row"] + 1) / 2, @@ -294,15 +329,23 @@ predict_rt <- function( gi_pmf = gi_pmf, call = call ) - fitted <- gratia::fitted_samples( - object[["model"]], + args <- list( + model = object[["model"]], data = newdata, n = n, seed = seed, unconditional = TRUE, scale = "response", + newdata.guaranteed = TRUE, ... ) + if (is.factor(object[["data"]][["day_of_week"]])) { + args[["exclude"]] <- "s(day_of_week)" + } + fitted <- suppress_factor_warning(do.call( + what = gratia::fitted_samples, + args = args + )) # Rt calculation fitted <- rt_by_group(fitted, group_cols = ".draw", @@ -413,6 +456,7 @@ create_newdata_dataframe <- function( min_date, max_date, horizon, + day_of_week, mean_delay, gi_pmf, delta = delta, @@ -449,10 +493,33 @@ create_newdata_dataframe <- function( ) } - newdata <- gratia::data_slice(object[["model"]], timestep = timesteps) + + args <- list( + object = object[["model"]], + timestep = timesteps + ) + + # Handle day of week explictly to work around gratia::data_slice + # needing an explicit level + if (is.factor(object[["data"]][["day_of_week"]])) { + # Use a placeholder value to satisy gratia bc it can't + # reliably pick a factor level without erroring + args["day_of_week"] <- gratia::ref_level(object[["data"]][["day_of_week"]]) + } + + newdata <- do.call(what = gratia::data_slice, args = args) newdata[".row"] <- seq_along(timesteps) newdata["reference_date"] <- desired_dates + # And re-add day of week correctly for case where it's needed + # All other situations will ignore day of week in drawing samples + if (parameter == "obs_cases") { + if (!rlang::is_false(day_of_week)) { + dow <- extract_dow_for_predict(object, day_of_week, desired_dates, call) + newdata["day_of_week"] <- dow + } + } + newdata } @@ -521,3 +588,103 @@ rt_by_group <- function(df, group_cols, value_col, vec) { do.call(rbind, grouped_rt) } + +#' Manually map day-of-week effects, imputing where possible and outputting +#' an informative error message where not. +#' @noRd +extract_dow_for_predict <- function(object, day_of_week, desired_dates, call) { + validate_day_of_week(day_of_week) + + fit_data <- object[["data"]] + matching_dates <- desired_dates %in% fit_data[["reference_date"]] + all_desired_dates_in_fit <- all(matching_dates) + is_custom_vec <- !rlang::is_true(day_of_week) && !rlang::is_false(day_of_week) + if ( + rlang::is_true(day_of_week) && all_desired_dates_in_fit + ) { + desired_dates <- fit_data[ + fit_data[["reference_date"]] %in% desired_dates, + c("day_of_week", "reference_date") + ] + # dedupe in case of groups + deduped <- unique(desired_dates) + as.factor(deduped[["day_of_week"]]) + } else if ( + rlang::is_true(object[["day_of_week"]]) && rlang::is_true(day_of_week) + ) { + # If using default, we can impute day of week pattern + set_day_of_week_factor(object[["day_of_week"]], desired_dates) + } else if ( + is_custom_vec && length(day_of_week) == length(desired_dates) + ) { + # If user passes an appropriate length vector and is using + # a custom day of week, use their input + + # First check that all the levels were used in the fit + factor_dow <- as.factor(day_of_week) + known <- factor_dow %in% object[["data"]][["day_of_week"]] + if (!all(known)) { + cli::cli_abort(c( + "{.arg day_of_week} provided unknown level", + "!" = "Known levels: {.val {unique(fit_data[['day_of_week']])}}", + "x" = "Provided but unknown: {.val {unique(day_of_week[!known])}}" + ), call = call) + } + # If yes, return user-provided custom vector + factor_dow + } else if (!rlang::is_true(day_of_week)) { + # If vector provided but malformed error out with fix + n <- length(desired_dates) + mind <- min(desired_dates) + maxd <- max(desired_dates) + missing <- desired_dates[which(!matching_dates)] + + cli::cli_abort(c( + "{.arg day_of_week} was provided a vector of the wrong length", + ">" = "Provide {.val {n}} values, for {.val {mind}} to {.val {maxd}}", + "x" = "Was provided {.val {length(day_of_week)}} values instead" + )) + } else { + # Error out with informative message about custom day of week levels + n <- length(desired_dates) + mind <- min(desired_dates) + maxd <- max(desired_dates) + missing <- desired_dates[which(!matching_dates)] + + # Else tell user what we need + cli::cli_abort(c( + "{.arg day_of_week} required when using custom levels and new dates", + "x" = "{.val {missing}} {?wasn't/weren't} in the call to {.fn RtGam}", + "i" = "Pass {.fn predict} {.arg day_of_week} a vector of values to use", + ">" = "Provide {.val {n}} values, for {.val {mind}} to {.val {maxd}}" + )) + } +} + +#' Suppress mgcv warning that factor levels are far from the data +#' "factor levels 1 not in original fit". This warning is spurious. +#' We're explicitly excluding the day-of-week random effect smooth but +#' need to have some placeholder value in the dataset. +#' @noRd +suppress_factor_warning <- function(expr, call = rlang::caller_env()) { + rlang::try_fetch( + expr = expr, + warning = function(cnd) { + cnd_text <- as.character(cnd) + matched <- grepl( + pattern = "factor level?[s] [0-9]* not in original fit", + x = cnd_text + ) + # Rethrow + if (matched) { + # https://stackoverflow.com/questions/49817935 + invokeRestart("muffleWarning") + } else { + cli::cli_warn("Problem while drawing samples", + parent = cnd, + call = call + ) + } + } + ) +} diff --git a/R/print.R b/R/print.R index 18f1e18..458f836 100644 --- a/R/print.R +++ b/R/print.R @@ -3,6 +3,7 @@ new_RtGam <- function(fit, df, group, + day_of_week, k, m, backend, @@ -17,7 +18,8 @@ new_RtGam <- function(fit, m = m, backend = backend, formula = formula, - diagnostics = diagnostics + diagnostics = diagnostics, + day_of_week = day_of_week ) structure(formatted, class = "RtGam") @@ -65,6 +67,9 @@ print.RtGam <- function(x, ...) { cat(x$k, "\n") cat("Family:", x$model$family$family, "\n") cat("Link function:", x$model$family$link) + if (is.factor(x[["data"]][["day_of_week"]])) { + cat("\nUsing day-of-week effects") + } cat("\n===============================\n") # Data @@ -80,6 +85,11 @@ print.RtGam <- function(x, ...) { } else { cat(length(unique(x[["data"]][["group"]]))) } + if (is.factor(x[["data"]][["day_of_week"]])) { + cat("\nDay-of-week levels: ") + cat(nlevels(x[["data"]][["day_of_week"]])) + } + cat("\n\n") invisible(x) } diff --git a/R/validate.R b/R/validate.R index bcae1f5..9116ce0 100644 --- a/R/validate.R +++ b/R/validate.R @@ -8,6 +8,7 @@ validate <- function(cases, reference_date, group, + day_of_week, k, m, call = rlang::caller_env()) { @@ -15,6 +16,7 @@ validate <- function(cases, validate_cases(cases, call) reference_date <- validate_dates(reference_date, "reference_date", call) validate_group(group, call) + validate_day_of_week(day_of_week, call) validate_min_dimensionality(k, arg = "k", min_dim = 3, @@ -29,7 +31,20 @@ validate <- function(cases, ) # Per-group checks - check_vectors_equal_length(cases, reference_date, group, call) + check_vectors_equal_length( + reference_date = reference_date, + cases = cases, + group = group, + call = call + ) + # Only check day of week length if it's not a bool + if (length(day_of_week) > 1) { + check_vectors_equal_length( + reference_date = reference_date, + day_of_week = day_of_week, + call = call + ) + } check_dates_unique(reference_date, group, call) invisible(reference_date) @@ -61,6 +76,18 @@ validate_group <- function(group, call) { } } +#' Check day of week is a bare bool or is vector of corresponding elements +#' @noRd +validate_day_of_week <- function(day_of_week, call) { + arg <- "day_of_week" + # If `day_of_week` is a bare bool, pass + if (!(rlang::is_true(day_of_week) || rlang::is_false(day_of_week))) { + check_vector(day_of_week, arg, call) + check_no_missingness(day_of_week, arg, call) + } + invisible() +} + #' Used by both dimensionality_heuristic() and RtGam() #' @noRd validate_min_dimensionality <- function(n, arg, min_dim, max_val = NA, call) { diff --git a/inst/WORDLIST b/inst/WORDLIST index 14405d8..b8625c6 100644 --- a/inst/WORDLIST +++ b/inst/WORDLIST @@ -8,12 +8,13 @@ CoV Cori Dependabot Epidemiol -GHA Gratia Justfile MERCHANTABILITY Mellor NOTEs +Norovirus +Nowcasting PLoS PMF README @@ -35,9 +36,9 @@ ggplot http https md +medRxiv mgcv modelling -mutliply nolint nowcast oversmoothing diff --git a/man/RtGam.Rd b/man/RtGam.Rd index 7533b56..3a39e78 100644 --- a/man/RtGam.Rd +++ b/man/RtGam.Rd @@ -8,6 +8,7 @@ RtGam( cases, reference_date, group = NULL, + day_of_week = TRUE, k = smooth_dim_heuristic(length(cases)), m = penalty_dim_heuristic(length(unique(reference_date))), backend = "gam", @@ -26,6 +27,14 @@ once.} \item{group}{The grouping variable for the case/reference-date pair. Not yet implemented and a value other than \code{NULL} will throw an error.} +\item{day_of_week}{A boolean or a vector of custom values to be applied to the +model as a random effect. If \code{TRUE}, then \code{RtGam} will use the parsed +\code{reference_date} values to infer the day of week. If a vector of the same +length as \code{reference_date}, then the user-supplied values are used as the +day-of-week effect, overriding the actual day of week. This approach can +be used to, for example, adjust for atypical reporting due to a holiday. +If \code{FALSE} no day of week effect is applied.} + \item{k}{An integer, the \emph{total} dimension of all the smoothing basis functions. Defaults to \code{smooth_dim_heuristic(length(cases))}, which picks a reasonable estimate based on the number of provided data points. This total @@ -76,10 +85,10 @@ familiarity with \code{mgcv} may be helpful. \section{Model specification}{ Incident cases (\eqn{y}) are modeled as smoothly changing over time: -\deqn{\text{log}\{E(y)\} = \alpha + f_{\text{global}}(t)} +\deqn{\text{log}\{E(y)\} = \alpha + f_{\text{global}}(t) + \omega(\text{wday}(t))} -where incidence is negative-binomially distributed and \eqn{f(t)} is a smooth -function of time. +where incidence is negative-binomially distributed, \eqn{f(t)} is a smooth +function of time, and \eqn{\omega(\text{wday}(t))} is a random day-of-week effect. } \examples{ @@ -94,6 +103,13 @@ reference_date <- seq.Date( fit <- RtGam(cases, reference_date) fit } +\references{ +Mellor, Jonathon, et al. "An Application of Nowcasting Methods: Cases of +Norovirus during the Winter 2023/2024 in England." medRxiv (2024): 2024-07. \cr +Ward, Thomas, et al. "Growth, reproduction numbers and factors affecting the +spread of SARS-CoV-2 novel variants of concern in the UK from October 2020 +to July 2021: a modelling analysis." BMJ open 11.11 (2021): e056636. \cr +} \seealso{ \code{\link[=smooth_dim_heuristic]{smooth_dim_heuristic()}} more information on the smoothing basis dimension, \link[mgcv:choose.k]{mgcv::choose.k} for more general guidance on GAMs from \code{mgcv}, diff --git a/man/dataset_creator.Rd b/man/dataset_creator.Rd index a71a092..3a1e602 100644 --- a/man/dataset_creator.Rd +++ b/man/dataset_creator.Rd @@ -4,7 +4,7 @@ \alias{dataset_creator} \title{Parse input vectors into a format for \code{{mgcv}}} \usage{ -dataset_creator(cases, reference_date, group, backend) +dataset_creator(cases, reference_date, group, day_of_week, backend) } \arguments{ \item{cases}{A vector of non-negative incident case counts occurring on an @@ -17,6 +17,14 @@ once.} \item{group}{The grouping variable for the case/reference-date pair. Not yet implemented and a value other than \code{NULL} will throw an error.} +\item{day_of_week}{A boolean or a vector of custom values to be applied to the +model as a random effect. If \code{TRUE}, then \code{RtGam} will use the parsed +\code{reference_date} values to infer the day of week. If a vector of the same +length as \code{reference_date}, then the user-supplied values are used as the +day-of-week effect, overriding the actual day of week. This approach can +be used to, for example, adjust for atypical reporting due to a holiday. +If \code{FALSE} no day of week effect is applied.} + \item{backend}{One of \code{gam} or \code{bam}; defaults to \code{gam}. In general, models should be fit with \code{\link[mgcv:gam]{mgcv::gam()}}. If \code{\link[mgcv:gam]{mgcv::gam()}} is too slow, \code{\link[mgcv:bam]{mgcv::bam()}} converges more quickly but introduces some additional diff --git a/man/predict.RtGam.Rd b/man/predict.RtGam.Rd index 1cc00ac..19e2d40 100644 --- a/man/predict.RtGam.Rd +++ b/man/predict.RtGam.Rd @@ -10,6 +10,7 @@ horizon = NULL, min_date = NULL, max_date = NULL, + day_of_week = TRUE, n = 100, mean_delay = NULL, gi_pmf = NULL, @@ -33,6 +34,16 @@ predicts the next 7 days.} and end of the prediction range. See \strong{Details} for more information on their usage.} +\item{day_of_week}{How to handle day-of-week effects when predicting +\code{obs_cases}. Defaults to \code{TRUE}, which identifies and applies the fitted +day-of-week effect, if possible. When automatic detection fails or +different levels are desirable, custom levels can be applied with a vector +of equal length to the number of desired dates. If \code{FALSE}, the day-of-week +effect is turned off (i.e., set to zero). When predicting parameters other +than \code{obs_cases} or \code{object} is an \code{RtGam} model that did not include +day-of-week effects, the day-of-week effect is turned off and this argument +is silently ignored.} + \item{n}{An integer specifying the number of posterior samples to use for predictions. Default is 100.} @@ -124,11 +135,12 @@ Samples are drawn from the posterior distribution of the fitted model using the \code{gratia} package. The model estimates basis function coefficients on the smooth terms \eqn{\hat \beta} and smoothing parameter(s) \eqn{\lambda}. The coefficients have the joint posterior distribution -\deqn{\beta | \lambda \sim N(\hat \beta, \mathbf{V}_{\hat \beta}} +\deqn{\beta | \lambda \sim N(\hat \beta, \mathbf{V}_{\hat \beta})} where \eqn{\mathbf{V}_{\hat \beta}} is the smoothing-parameter uncertainty corrected covariance matrix of the basis function coefficients. We draw samples from \eqn{\mathbf{V}_{\hat \beta}} and multiply them by the dates of -interest to generate posterior draws. +interest to generate posterior draws. If estimating \code{"Rt"} or \code{"r"} +the day-of-week effect is excluded (i.e., set to zero). For the intrinsic growth rate, we draw one day before and one day after every day of interest. We difference these two days within the smooth to get growth diff --git a/man/predictor.Rd b/man/predictor.Rd index 015a06d..e8b91e8 100644 --- a/man/predictor.Rd +++ b/man/predictor.Rd @@ -12,6 +12,7 @@ predict_obs_cases( horizon = NULL, min_date = NULL, max_date = NULL, + day_of_week = TRUE, n = 10, gi_pmf = NULL, seed = 12345, @@ -57,6 +58,16 @@ predicts the next 7 days.} and end of the prediction range. See \strong{Details} for more information on their usage.} +\item{day_of_week}{How to handle day-of-week effects when predicting +\code{obs_cases}. Defaults to \code{TRUE}, which identifies and applies the fitted +day-of-week effect, if possible. When automatic detection fails or +different levels are desirable, custom levels can be applied with a vector +of equal length to the number of desired dates. If \code{FALSE}, the day-of-week +effect is turned off (i.e., set to zero). When predicting parameters other +than \code{obs_cases} or \code{object} is an \code{RtGam} model that did not include +day-of-week effects, the day-of-week effect is turned off and this argument +is silently ignored.} + \item{n}{An integer specifying the number of posterior samples to use for predictions. Default is 100.} @@ -150,11 +161,12 @@ Samples are drawn from the posterior distribution of the fitted model using the \code{gratia} package. The model estimates basis function coefficients on the smooth terms \eqn{\hat \beta} and smoothing parameter(s) \eqn{\lambda}. The coefficients have the joint posterior distribution -\deqn{\beta | \lambda \sim N(\hat \beta, \mathbf{V}_{\hat \beta}} +\deqn{\beta | \lambda \sim N(\hat \beta, \mathbf{V}_{\hat \beta})} where \eqn{\mathbf{V}_{\hat \beta}} is the smoothing-parameter uncertainty corrected covariance matrix of the basis function coefficients. We draw samples from \eqn{\mathbf{V}_{\hat \beta}} and multiply them by the dates of -interest to generate posterior draws. +interest to generate posterior draws. If estimating \code{"Rt"} or \code{"r"} +the day-of-week effect is excluded (i.e., set to zero). For the intrinsic growth rate, we draw one day before and one day after every day of interest. We difference these two days within the smooth to get growth diff --git a/tests/testthat/_snaps/dataset_creator.md b/tests/testthat/_snaps/dataset_creator.md new file mode 100644 index 0000000..28237f0 --- /dev/null +++ b/tests/testthat/_snaps/dataset_creator.md @@ -0,0 +1,8 @@ +# Day of week parsed appropriately + + Code + set_day_of_week_factor(NULL, reference_date) + Condition + Error in `set_day_of_week_factor()`: + ! `day_of_week` has an unexpected type. See `?RtGam()` + diff --git a/tests/testthat/_snaps/plot/forecast.svg b/tests/testthat/_snaps/plot/forecast.svg index 5db8e21..831d896 100644 --- a/tests/testthat/_snaps/plot/forecast.svg +++ b/tests/testthat/_snaps/plot/forecast.svg @@ -21,348 +21,217 @@ <rect x='0.00' y='0.00' width='720.00' height='576.00' style='stroke-width: 1.07; stroke: #FFFFFF; fill: #FFFFFF;' /> </g> <defs> - <clipPath id='cpNDIuNTh8NzE0LjUyfDIyLjc4fDU0NS4xMQ=='> - <rect x='42.58' y='22.78' width='671.94' height='522.33' /> + <clipPath id='cpNDcuNDh8NzE0LjUyfDIyLjc4fDU0NS4xMQ=='> + <rect x='47.48' y='22.78' width='667.04' height='522.33' /> </clipPath> </defs> -<g clip-path='url(#cpNDIuNTh8NzE0LjUyfDIyLjc4fDU0NS4xMQ==)'> -<rect x='42.58' y='22.78' width='671.94' height='522.33' style='stroke-width: 1.07; stroke: none; fill: #FFFFFF;' /> -<polyline points='42.58,534.46 714.52,534.46 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,427.17 714.52,427.17 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,319.89 714.52,319.89 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,212.60 714.52,212.60 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,105.32 714.52,105.32 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='179.81,545.11 179.81,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='447.24,545.11 447.24,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,480.82 714.52,480.82 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,373.53 714.52,373.53 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,266.25 714.52,266.25 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,158.96 714.52,158.96 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,51.68 714.52,51.68 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='46.82,545.11 46.82,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='312.79,545.11 312.79,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='581.68,545.11 581.68,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<circle cx='73.13' cy='103.17' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='76.05' cy='108.32' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='78.97' cy='99.74' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='81.89' cy='98.45' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='84.82' cy='107.68' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='87.74' cy='89.01' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='90.66' cy='107.03' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='93.58' cy='104.67' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='96.51' cy='61.76' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='99.43' cy='86.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='102.35' cy='81.72' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='105.28' cy='73.78' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='108.20' cy='86.22' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='111.12' cy='62.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='114.04' cy='84.72' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='116.97' cy='92.44' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='119.89' cy='93.09' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='122.81' cy='99.74' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='125.73' cy='81.72' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='128.66' cy='61.33' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='131.58' cy='80.00' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='134.50' cy='82.79' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='137.43' cy='79.57' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='140.35' cy='71.42' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='143.27' cy='86.22' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='146.19' cy='59.40' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='149.12' cy='71.63' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='152.04' cy='48.67' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='154.96' cy='61.33' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='157.88' cy='65.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='160.81' cy='57.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='163.73' cy='59.40' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='166.65' cy='72.27' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='169.58' cy='62.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='172.50' cy='52.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='175.42' cy='52.75' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='178.34' cy='48.03' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='181.27' cy='46.53' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='184.19' cy='62.40' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='187.11' cy='61.33' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='190.03' cy='73.99' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='192.96' cy='48.03' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='195.88' cy='62.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='198.80' cy='66.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='201.73' cy='56.61' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='204.65' cy='48.67' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='207.57' cy='62.19' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='210.49' cy='69.06' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='213.42' cy='57.04' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='216.34' cy='61.97' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='219.26' cy='57.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='222.19' cy='63.69' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='225.11' cy='73.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='228.03' cy='69.91' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='230.95' cy='76.57' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='233.88' cy='85.79' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='236.80' cy='70.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='239.72' cy='93.95' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='242.64' cy='76.14' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='245.57' cy='87.08' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='248.49' cy='81.07' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='251.41' cy='102.74' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='254.34' cy='110.90' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='257.26' cy='91.37' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='260.18' cy='84.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='263.10' cy='105.53' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='266.03' cy='91.16' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='268.95' cy='103.60' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='271.87' cy='105.10' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='274.79' cy='122.05' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='277.72' cy='112.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='280.64' cy='119.05' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='283.56' cy='139.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='286.49' cy='139.65' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='289.41' cy='158.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='292.33' cy='137.72' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='295.25' cy='142.01' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='298.18' cy='150.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='301.10' cy='139.01' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='304.02' cy='168.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='306.94' cy='151.88' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='309.87' cy='175.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='312.79' cy='171.19' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='315.71' cy='174.41' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='318.64' cy='181.49' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='321.56' cy='192.00' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='324.48' cy='190.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='327.40' cy='204.88' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='330.33' cy='212.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='333.25' cy='187.50' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='336.17' cy='193.94' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='339.09' cy='199.09' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='342.02' cy='201.45' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='344.94' cy='212.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='347.86' cy='236.21' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='350.79' cy='225.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='353.71' cy='225.26' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='356.63' cy='243.07' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='359.55' cy='254.02' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='362.48' cy='239.21' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='365.40' cy='241.36' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='368.32' cy='243.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='371.24' cy='244.79' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='374.17' cy='250.37' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='377.09' cy='269.46' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='380.01' cy='260.88' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='382.94' cy='275.26' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='385.86' cy='264.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='388.78' cy='280.84' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='391.70' cy='285.99' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='394.63' cy='281.69' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='397.55' cy='290.49' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='400.47' cy='295.43' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='403.39' cy='291.35' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='406.32' cy='299.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='409.24' cy='306.37' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='412.16' cy='310.66' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='415.09' cy='326.97' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='418.01' cy='312.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='420.93' cy='326.75' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='423.85' cy='324.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='426.78' cy='351.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='429.70' cy='338.56' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='432.62' cy='337.05' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='435.55' cy='344.99' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='438.47' cy='347.14' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='441.39' cy='337.91' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='444.31' cy='352.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='447.24' cy='355.72' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='450.16' cy='356.79' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='453.08' cy='354.65' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='456.00' cy='368.17' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='458.93' cy='359.58' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='461.85' cy='358.30' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='464.77' cy='366.02' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='467.70' cy='372.24' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='470.62' cy='371.60' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='473.54' cy='365.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='476.46' cy='378.04' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='479.39' cy='378.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='482.31' cy='389.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='485.23' cy='385.55' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='488.15' cy='376.54' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='491.08' cy='393.92' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='494.00' cy='397.78' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='496.92' cy='388.12' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='499.85' cy='392.41' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='502.77' cy='393.27' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='505.69' cy='395.85' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='508.61' cy='408.51' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='511.54' cy='397.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='514.46' cy='414.30' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='517.38' cy='410.01' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='520.30' cy='416.45' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='523.23' cy='416.23' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='526.15' cy='412.58' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='529.07' cy='418.38' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='532.00' cy='416.45' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='534.92' cy='430.18' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='537.84' cy='436.61' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='540.76' cy='419.88' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='543.69' cy='427.17' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='546.61' cy='434.47' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='549.53' cy='433.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='552.45' cy='433.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='555.38' cy='446.49' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='558.30' cy='439.40' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='561.22' cy='446.27' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='564.15' cy='447.77' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='567.07' cy='446.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='569.99' cy='446.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='572.91' cy='455.07' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='575.84' cy='444.55' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='578.76' cy='461.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='581.68' cy='460.22' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='584.60' cy='462.58' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='587.53' cy='467.30' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='590.45' cy='464.08' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='593.37' cy='467.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='596.30' cy='464.29' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='599.22' cy='477.60' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='602.14' cy='476.31' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='605.06' cy='475.24' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='607.99' cy='470.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='610.91' cy='474.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='613.83' cy='482.10' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='616.75' cy='479.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='619.68' cy='473.31' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='622.60' cy='483.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='625.52' cy='486.61' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='628.45' cy='485.11' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='631.37' cy='484.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='634.29' cy='488.11' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='637.21' cy='487.04' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='640.14' cy='493.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='643.06' cy='489.18' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='645.98' cy='491.76' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='648.91' cy='499.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='651.83' cy='496.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='654.75' cy='491.97' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<polyline points='657.67,493.26 660.60,497.34 663.52,496.05 666.44,492.19 669.36,498.84 672.29,504.63 675.21,503.78 678.13,508.07 681.06,506.99 683.98,497.55 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,498.20 660.60,495.84 663.52,491.76 666.44,500.77 669.36,504.63 672.29,502.70 675.21,515.79 678.13,503.35 681.06,513.86 683.98,506.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,487.47 660.60,495.62 663.52,499.48 666.44,489.83 669.36,500.13 672.29,497.55 675.21,510.00 678.13,498.20 681.06,503.99 683.98,497.77 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,494.55 660.60,503.35 663.52,498.20 666.44,503.35 669.36,495.19 672.29,505.49 675.21,501.20 678.13,498.41 681.06,511.50 683.98,518.58 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,494.12 660.60,497.77 663.52,504.42 666.44,505.28 669.36,510.43 672.29,506.56 675.21,505.06 678.13,502.70 681.06,504.20 683.98,504.63 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,492.83 660.60,511.07 663.52,499.48 666.44,509.57 669.36,507.85 672.29,506.56 675.21,505.06 678.13,516.01 681.06,506.99 683.98,508.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,505.06 660.60,497.12 663.52,501.42 666.44,501.42 669.36,500.77 672.29,505.92 675.21,502.49 678.13,503.78 681.06,505.28 683.98,507.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,496.48 660.60,499.27 663.52,501.42 666.44,507.64 669.36,507.64 672.29,500.13 675.21,508.28 678.13,510.86 681.06,513.65 683.98,507.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.84 660.60,505.06 663.52,499.70 666.44,511.93 669.36,506.99 672.29,510.64 675.21,510.43 678.13,506.99 681.06,506.35 683.98,521.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,510.64 660.60,501.42 663.52,504.42 666.44,506.14 669.36,500.13 672.29,503.56 675.21,505.06 678.13,506.99 681.06,503.78 683.98,505.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,505.71 660.60,508.93 663.52,502.70 666.44,506.14 669.36,512.57 672.29,509.35 675.21,514.50 678.13,511.93 681.06,515.15 683.98,519.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,499.70 660.60,498.20 663.52,503.99 666.44,510.21 669.36,507.64 672.29,504.85 675.21,510.21 678.13,510.43 681.06,508.07 683.98,515.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,490.90 660.60,510.64 663.52,497.55 666.44,498.20 669.36,505.92 672.29,506.14 675.21,499.70 678.13,509.57 681.06,500.13 683.98,510.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,497.34 660.60,502.70 663.52,505.06 666.44,501.20 669.36,500.99 672.29,504.20 675.21,510.64 678.13,499.70 681.06,507.64 683.98,508.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,506.35 660.60,500.56 663.52,508.07 666.44,504.42 669.36,503.78 672.29,508.93 675.21,504.85 678.13,506.78 681.06,503.78 683.98,514.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,490.04 660.60,495.62 663.52,500.34 666.44,491.54 669.36,502.27 672.29,500.13 675.21,501.42 678.13,511.50 681.06,508.93 683.98,510.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,497.12 660.60,501.63 663.52,495.84 666.44,508.50 669.36,505.92 672.29,500.56 675.21,507.21 678.13,514.07 681.06,509.57 683.98,516.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,500.13 660.60,503.13 663.52,502.27 666.44,498.63 669.36,498.63 672.29,509.78 675.21,495.19 678.13,502.49 681.06,505.28 683.98,507.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,494.76 660.60,505.28 663.52,506.99 666.44,506.35 669.36,509.14 672.29,506.99 675.21,513.00 678.13,511.29 681.06,508.50 683.98,510.00 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,489.18 660.60,490.04 663.52,496.69 666.44,500.77 669.36,499.91 672.29,500.77 675.21,500.99 678.13,502.49 681.06,503.35 683.98,498.63 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,498.41 660.60,502.06 663.52,486.82 666.44,485.97 669.36,503.13 672.29,499.27 675.21,499.70 678.13,503.99 681.06,508.50 683.98,503.56 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,496.27 660.60,500.56 663.52,500.34 666.44,510.64 669.36,505.71 672.29,496.91 675.21,501.84 678.13,508.07 681.06,509.78 683.98,503.56 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.49 660.60,502.06 663.52,502.92 666.44,497.55 669.36,509.35 672.29,511.50 675.21,507.21 678.13,512.14 681.06,512.14 683.98,507.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,497.12 660.60,500.99 663.52,501.20 666.44,503.56 669.36,510.86 672.29,503.56 675.21,514.50 678.13,519.87 681.06,500.99 683.98,513.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,496.48 660.60,500.13 663.52,496.27 666.44,501.42 669.36,497.77 672.29,497.55 675.21,499.70 678.13,504.42 681.06,502.70 683.98,501.63 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,504.63 660.60,505.06 663.52,500.13 666.44,496.91 669.36,501.20 672.29,507.42 675.21,504.42 678.13,506.99 681.06,501.42 683.98,514.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,496.48 660.60,503.35 663.52,500.77 666.44,510.00 669.36,503.99 672.29,510.43 675.21,497.98 678.13,506.99 681.06,506.99 683.98,509.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,492.19 660.60,508.07 663.52,504.42 666.44,505.71 669.36,508.71 672.29,500.13 675.21,501.63 678.13,508.28 681.06,510.64 683.98,518.58 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,498.84 660.60,487.68 663.52,499.05 666.44,505.49 669.36,491.76 672.29,502.49 675.21,504.63 678.13,499.05 681.06,507.42 683.98,512.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.42 660.60,497.55 663.52,497.77 666.44,503.56 669.36,502.49 672.29,513.43 675.21,507.42 678.13,510.21 681.06,506.99 683.98,509.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.84 660.60,503.78 663.52,491.54 666.44,505.71 669.36,508.28 672.29,504.20 675.21,511.71 678.13,503.78 681.06,498.63 683.98,502.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,506.78 660.60,497.55 663.52,498.20 666.44,504.20 669.36,507.42 672.29,501.20 675.21,514.29 678.13,504.85 681.06,504.85 683.98,507.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,498.84 660.60,490.04 663.52,502.49 666.44,499.27 669.36,497.55 672.29,513.65 675.21,506.78 678.13,508.50 681.06,508.93 683.98,507.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.42 660.60,499.91 663.52,503.78 666.44,504.20 669.36,505.71 672.29,500.99 675.21,502.49 678.13,508.50 681.06,511.71 683.98,518.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,499.48 660.60,493.91 663.52,498.63 666.44,503.35 669.36,507.64 672.29,506.56 675.21,512.14 678.13,511.29 681.06,512.14 683.98,514.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.42 660.60,498.20 663.52,497.12 666.44,502.70 669.36,505.71 672.29,505.28 675.21,511.50 678.13,509.35 681.06,512.14 683.98,520.73 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,485.75 660.60,496.27 663.52,490.90 666.44,500.56 669.36,496.27 672.29,503.35 675.21,506.14 678.13,501.20 681.06,505.92 683.98,499.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,491.54 660.60,496.91 663.52,497.12 666.44,510.00 669.36,502.06 672.29,506.99 675.21,507.42 678.13,513.00 681.06,511.93 683.98,507.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,504.42 660.60,494.33 663.52,500.99 666.44,506.14 669.36,504.20 672.29,503.99 675.21,504.42 678.13,509.57 681.06,507.42 683.98,508.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,490.47 660.60,490.69 663.52,500.34 666.44,498.20 669.36,503.35 672.29,506.99 675.21,500.77 678.13,493.48 681.06,496.91 683.98,501.84 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,488.97 660.60,501.42 663.52,507.21 666.44,497.12 669.36,497.34 672.29,499.91 675.21,500.99 678.13,509.78 681.06,505.49 683.98,510.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,496.48 660.60,498.63 663.52,506.56 666.44,500.56 669.36,503.13 672.29,499.70 675.21,505.92 678.13,502.06 681.06,500.77 683.98,502.92 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.92 660.60,507.42 663.52,500.56 666.44,488.97 669.36,507.85 672.29,501.63 675.21,507.42 678.13,512.57 681.06,503.78 683.98,506.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.06 660.60,503.78 663.52,505.92 666.44,505.06 669.36,507.64 672.29,510.43 675.21,506.99 678.13,505.49 681.06,505.71 683.98,505.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,497.34 660.60,503.56 663.52,499.05 666.44,499.27 669.36,503.13 672.29,505.71 675.21,506.14 678.13,509.14 681.06,510.43 683.98,509.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,492.19 660.60,496.91 663.52,498.84 666.44,500.99 669.36,514.07 672.29,500.56 675.21,502.27 678.13,514.50 681.06,515.58 683.98,503.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,490.69 660.60,503.56 663.52,498.84 666.44,496.69 669.36,499.91 672.29,503.56 675.21,504.42 678.13,500.13 681.06,502.49 683.98,500.56 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.06 660.60,506.14 663.52,497.12 666.44,498.41 669.36,503.99 672.29,504.85 675.21,515.15 678.13,513.65 681.06,509.35 683.98,510.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.92 660.60,501.20 663.52,503.13 666.44,496.48 669.36,500.99 672.29,498.20 675.21,502.92 678.13,511.29 681.06,506.14 683.98,500.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,505.49 660.60,500.13 663.52,499.91 666.44,504.20 669.36,504.63 672.29,511.50 675.21,505.06 678.13,507.64 681.06,508.28 683.98,507.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,504.42 660.60,508.93 663.52,500.34 666.44,503.99 669.36,500.34 672.29,507.42 675.21,506.35 678.13,512.57 681.06,508.28 683.98,508.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,507.64 660.60,502.92 663.52,503.56 666.44,498.84 669.36,503.99 672.29,499.91 675.21,505.49 678.13,511.93 681.06,515.15 683.98,505.92 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,503.56 660.60,511.93 663.52,511.50 666.44,508.71 669.36,509.35 672.29,511.29 675.21,520.51 678.13,503.99 681.06,510.00 683.98,507.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,491.76 660.60,493.91 663.52,495.41 666.44,494.98 669.36,498.41 672.29,503.13 675.21,502.27 678.13,501.84 681.06,502.92 683.98,497.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,498.41 660.60,497.55 663.52,498.63 666.44,506.99 669.36,508.50 672.29,505.92 675.21,518.37 678.13,495.62 681.06,506.14 683.98,507.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,503.56 660.60,500.56 663.52,499.05 666.44,497.34 669.36,505.28 672.29,501.63 675.21,490.69 678.13,502.27 681.06,509.35 683.98,503.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,495.84 660.60,495.41 663.52,502.27 666.44,503.99 669.36,503.56 672.29,509.78 675.21,512.36 678.13,509.57 681.06,509.14 683.98,512.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,504.42 660.60,501.84 663.52,497.77 666.44,499.91 669.36,497.98 672.29,503.78 675.21,505.92 678.13,507.21 681.06,502.70 683.98,507.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,495.62 660.60,505.92 663.52,502.27 666.44,505.06 669.36,500.13 672.29,500.34 675.21,508.07 678.13,497.77 681.06,500.34 683.98,505.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,500.56 660.60,500.13 663.52,503.78 666.44,504.42 669.36,501.63 672.29,505.06 675.21,508.71 678.13,510.86 681.06,513.86 683.98,511.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,483.82 660.60,502.92 663.52,495.84 666.44,508.28 669.36,504.63 672.29,497.55 675.21,498.63 678.13,505.49 681.06,503.13 683.98,501.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,503.35 660.60,499.91 663.52,495.84 666.44,500.34 669.36,496.91 672.29,499.05 675.21,505.92 678.13,513.00 681.06,506.78 683.98,512.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,507.64 660.60,501.84 663.52,498.41 666.44,504.85 669.36,503.99 672.29,500.99 675.21,506.99 678.13,509.78 681.06,508.71 683.98,505.06 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,495.41 660.60,498.41 663.52,501.42 666.44,496.91 669.36,501.42 672.29,494.98 675.21,512.57 678.13,504.42 681.06,502.27 683.98,504.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.27 660.60,502.06 663.52,495.84 666.44,505.49 669.36,502.27 672.29,505.71 675.21,515.58 678.13,503.99 681.06,513.65 683.98,507.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.06 660.60,497.77 663.52,503.56 666.44,499.05 669.36,502.70 672.29,505.71 675.21,504.85 678.13,505.28 681.06,507.21 683.98,514.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,499.05 660.60,500.99 663.52,502.49 666.44,495.62 669.36,509.78 672.29,503.78 675.21,508.71 678.13,510.21 681.06,508.93 683.98,510.00 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,500.34 660.60,495.19 663.52,504.63 666.44,502.06 669.36,499.48 672.29,503.99 675.21,512.79 678.13,507.85 681.06,511.50 683.98,509.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,498.84 660.60,502.70 663.52,499.70 666.44,511.93 669.36,506.56 672.29,507.21 675.21,511.07 678.13,507.42 681.06,513.22 683.98,516.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,499.27 660.60,498.84 663.52,502.49 666.44,503.99 669.36,503.13 672.29,512.79 675.21,504.85 678.13,510.00 681.06,513.86 683.98,508.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,496.69 660.60,499.70 663.52,495.84 666.44,509.14 669.36,505.49 672.29,504.42 675.21,505.28 678.13,508.28 681.06,503.99 683.98,508.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,506.78 660.60,493.26 663.52,497.55 666.44,501.84 669.36,503.56 672.29,503.78 675.21,505.71 678.13,506.14 681.06,506.78 683.98,506.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,506.99 660.60,508.28 663.52,504.42 666.44,498.41 669.36,509.35 672.29,502.49 675.21,504.63 678.13,506.35 681.06,510.00 683.98,510.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,491.97 660.60,503.56 663.52,504.20 666.44,506.14 669.36,500.77 672.29,509.35 675.21,510.00 678.13,497.12 681.06,510.21 683.98,515.58 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,499.70 660.60,504.42 663.52,501.63 666.44,504.42 669.36,500.56 672.29,503.13 675.21,511.50 678.13,505.28 681.06,503.56 683.98,500.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.63 660.60,492.40 663.52,500.77 666.44,499.91 669.36,497.55 672.29,500.34 675.21,506.78 678.13,509.35 681.06,508.50 683.98,506.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.92 660.60,497.55 663.52,500.77 666.44,501.42 669.36,497.12 672.29,507.64 675.21,501.63 678.13,508.50 681.06,507.85 683.98,500.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,496.69 660.60,493.48 663.52,491.12 666.44,505.71 669.36,500.13 672.29,501.84 675.21,497.55 678.13,501.20 681.06,499.48 683.98,503.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.20 660.60,496.91 663.52,494.98 666.44,506.14 669.36,502.92 672.29,501.63 675.21,497.77 678.13,504.20 681.06,508.50 683.98,507.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.27 660.60,490.69 663.52,499.70 666.44,503.35 669.36,502.49 672.29,507.42 675.21,504.63 678.13,509.14 681.06,508.07 683.98,505.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.84 660.60,502.06 663.52,501.20 666.44,494.55 669.36,493.26 672.29,504.20 675.21,505.71 678.13,504.85 681.06,505.49 683.98,511.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,493.05 660.60,489.61 663.52,498.84 666.44,500.56 669.36,497.34 672.29,503.13 675.21,510.00 678.13,510.43 681.06,505.71 683.98,511.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.63 660.60,499.05 663.52,498.41 666.44,499.27 669.36,499.05 672.29,500.56 675.21,505.92 678.13,513.65 681.06,508.71 683.98,503.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,494.12 660.60,495.84 663.52,494.55 666.44,496.48 669.36,500.13 672.29,507.85 675.21,507.85 678.13,500.13 681.06,506.99 683.98,511.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,491.97 660.60,504.85 663.52,497.12 666.44,498.84 669.36,507.64 672.29,503.13 675.21,505.71 678.13,502.92 681.06,497.77 683.98,510.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,497.34 660.60,508.28 663.52,496.05 666.44,492.40 669.36,498.63 672.29,505.28 675.21,502.92 678.13,501.84 681.06,512.36 683.98,506.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,498.63 660.60,494.12 663.52,499.48 666.44,504.85 669.36,498.20 672.29,510.00 675.21,502.70 678.13,504.42 681.06,501.84 683.98,508.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,506.14 660.60,501.84 663.52,492.83 666.44,502.70 669.36,501.84 672.29,503.78 675.21,504.85 678.13,502.27 681.06,504.63 683.98,505.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,505.92 660.60,505.06 663.52,502.70 666.44,502.70 669.36,503.56 672.29,494.33 675.21,506.99 678.13,510.64 681.06,508.07 683.98,512.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,497.34 660.60,496.27 663.52,501.63 666.44,505.92 669.36,501.42 672.29,508.28 675.21,498.20 678.13,511.93 681.06,505.92 683.98,511.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,493.48 660.60,492.83 663.52,498.63 666.44,502.70 669.36,499.27 672.29,506.14 675.21,501.42 678.13,508.28 681.06,503.13 683.98,506.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,502.06 660.60,496.27 663.52,505.92 666.44,496.27 669.36,496.05 672.29,511.93 675.21,501.84 678.13,507.21 681.06,502.70 683.98,508.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,511.93 660.60,501.42 663.52,504.42 666.44,506.35 669.36,500.77 672.29,509.57 675.21,516.01 678.13,509.78 681.06,513.43 683.98,518.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,505.49 660.60,497.12 663.52,502.92 666.44,498.84 669.36,492.62 672.29,503.78 675.21,498.20 678.13,507.21 681.06,501.42 683.98,506.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,506.35 660.60,496.48 663.52,505.92 666.44,502.70 669.36,503.35 672.29,508.71 675.21,501.63 678.13,508.07 681.06,506.99 683.98,507.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,501.63 660.60,498.20 663.52,508.93 666.44,503.78 669.36,506.14 672.29,510.43 675.21,511.50 678.13,504.85 681.06,511.07 683.98,507.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,498.63 660.60,499.27 663.52,496.05 666.44,496.05 669.36,503.13 672.29,507.42 675.21,508.28 678.13,501.84 681.06,502.27 683.98,511.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,494.76 660.60,500.77 663.52,509.14 666.44,503.78 669.36,508.50 672.29,495.41 675.21,507.21 678.13,509.57 681.06,506.99 683.98,514.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,506.14 660.60,498.20 663.52,497.55 666.44,512.57 669.36,501.63 672.29,504.20 675.21,511.29 678.13,511.50 681.06,512.79 683.98,516.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='657.67,496.91 660.60,496.48 663.52,497.12 666.44,496.91 669.36,499.27 672.29,499.70 675.21,507.42 678.13,507.42 681.06,509.14 683.98,516.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<rect x='42.58' y='22.78' width='671.94' height='522.33' style='stroke-width: 1.07; stroke: #333333;' /> +<g clip-path='url(#cpNDcuNDh8NzE0LjUyfDIyLjc4fDU0NS4xMQ==)'> +<rect x='47.48' y='22.78' width='667.04' height='522.33' style='stroke-width: 1.07; stroke: none; fill: #FFFFFF;' /> +<polyline points='47.48,468.93 714.52,468.93 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,344.44 714.52,344.44 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,219.95 714.52,219.95 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,95.45 714.52,95.45 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='60.22,545.11 60.22,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='183.26,545.11 183.26,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='306.30,545.11 306.30,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='442.52,545.11 442.52,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='578.74,545.11 578.74,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='710.57,545.11 710.57,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,531.18 714.52,531.18 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,406.69 714.52,406.69 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,282.19 714.52,282.19 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,157.70 714.52,157.70 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,33.20 714.52,33.20 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='121.74,545.11 121.74,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='244.78,545.11 244.78,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='367.82,545.11 367.82,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='517.22,545.11 517.22,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='640.26,545.11 640.26,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<circle cx='77.80' cy='518.38' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='86.59' cy='515.37' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='95.37' cy='504.31' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='104.16' cy='493.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='112.95' cy='498.89' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='121.74' cy='485.34' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='130.53' cy='501.58' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='139.32' cy='497.39' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='148.11' cy='499.33' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='156.89' cy='421.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='165.68' cy='434.95' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='174.47' cy='459.87' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='183.26' cy='451.18' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='192.05' cy='449.44' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='200.84' cy='457.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='209.62' cy='450.43' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='218.41' cy='357.21' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='227.20' cy='440.00' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='235.99' cy='335.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='244.78' cy='395.71' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='253.57' cy='406.84' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='262.35' cy='419.56' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='271.14' cy='463.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='279.93' cy='358.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='288.72' cy='378.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='297.51' cy='404.92' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='306.30' cy='456.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='315.09' cy='484.40' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='323.87' cy='447.35' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='332.66' cy='457.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='341.45' cy='297.53' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='350.24' cy='387.59' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='359.03' cy='404.20' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='367.82' cy='430.99' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='376.60' cy='481.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='385.39' cy='481.43' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='394.18' cy='484.72' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='402.97' cy='421.68' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='411.76' cy='391.17' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='420.55' cy='424.19' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='429.34' cy='478.47' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='438.12' cy='504.31' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='446.91' cy='476.88' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='455.70' cy='500.26' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='464.49' cy='418.49' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='473.28' cy='426.90' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='482.07' cy='445.85' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='490.85' cy='475.23' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='499.64' cy='468.71' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='508.43' cy='495.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='517.22' cy='521.37' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='526.01' cy='458.53' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='534.80' cy='473.42' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='543.59' cy='481.68' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='552.37' cy='462.78' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='561.16' cy='486.14' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='569.95' cy='493.63' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='578.74' cy='497.47' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='587.53' cy='406.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='596.32' cy='422.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<polyline points='605.10,423.22 613.89,446.87 622.68,404.55 631.47,465.27 640.26,470.90 649.05,285.93 657.84,460.59 666.62,297.73 675.41,297.60 684.20,456.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,449.96 613.89,475.38 622.68,422.50 631.47,419.98 640.26,481.76 649.05,386.29 657.84,458.58 666.62,433.08 675.41,380.49 684.20,456.88 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,446.60 613.89,475.08 622.68,487.46 631.47,469.18 640.26,509.19 649.05,370.91 657.84,449.64 666.62,402.58 675.41,478.44 684.20,475.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,456.43 613.89,452.30 622.68,480.93 631.47,454.74 640.26,491.57 649.05,357.61 657.84,344.59 666.62,413.98 675.41,438.91 684.20,460.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,467.36 613.89,460.54 622.68,499.71 631.47,494.33 640.26,508.22 649.05,391.62 657.84,444.73 666.62,442.17 675.41,459.20 684.20,465.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,466.07 613.89,482.45 622.68,489.25 631.47,481.83 640.26,492.79 649.05,427.85 657.84,469.11 666.62,497.59 675.41,466.44 684.20,493.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,462.48 613.89,468.36 622.68,501.53 631.47,499.73 640.26,503.59 649.05,435.49 657.84,460.87 666.62,483.15 675.41,451.16 684.20,480.26 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,380.37 613.89,437.04 622.68,444.96 631.47,443.89 640.26,476.10 649.05,373.77 657.84,330.94 666.62,358.16 675.41,323.92 684.20,364.53 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,452.30 613.89,478.99 622.68,426.28 631.47,458.48 640.26,441.20 649.05,256.50 657.84,286.95 666.62,349.82 675.41,283.49 684.20,367.27 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,511.01 613.89,483.30 622.68,502.32 631.47,507.23 640.26,500.48 649.05,456.73 657.84,476.68 666.62,488.90 675.41,476.15 684.20,495.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,461.54 613.89,465.40 622.68,458.65 631.47,470.75 640.26,488.35 649.05,374.57 657.84,407.76 666.62,394.39 675.41,403.45 684.20,462.88 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,439.85 613.89,449.01 622.68,491.37 631.47,503.62 640.26,502.07 649.05,396.58 657.84,449.41 666.62,447.79 675.41,450.88 684.20,498.54 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,406.06 613.89,504.69 622.68,463.31 631.47,441.54 640.26,499.78 649.05,408.23 657.84,421.30 666.62,441.22 675.41,462.21 684.20,467.46 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,502.47 613.89,473.86 622.68,499.14 631.47,483.00 640.26,497.49 649.05,493.81 657.84,447.02 666.62,478.17 675.41,464.55 684.20,475.08 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,498.61 613.89,459.27 622.68,455.74 631.47,457.08 640.26,467.49 649.05,184.37 657.84,345.34 666.62,372.45 675.41,451.28 684.20,416.27 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,485.34 613.89,447.55 622.68,498.41 631.47,462.93 640.26,507.43 649.05,334.83 657.84,408.40 666.62,463.48 675.41,466.44 684.20,484.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,493.98 613.89,460.62 622.68,503.92 631.47,496.89 640.26,514.17 649.05,491.04 657.84,485.17 666.62,506.68 675.41,504.99 684.20,518.76 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,468.51 613.89,476.08 622.68,473.22 631.47,501.35 640.26,469.48 649.05,405.27 657.84,435.72 666.62,449.74 675.41,459.02 684.20,427.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,396.25 613.89,470.40 622.68,480.74 631.47,475.91 640.26,498.02 649.05,409.80 657.84,348.72 666.62,347.08 675.41,371.28 684.20,382.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,469.48 613.89,481.23 622.68,489.97 631.47,497.34 640.26,491.69 649.05,426.73 657.84,448.72 666.62,427.45 675.41,467.36 684.20,495.30 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,398.72 613.89,427.30 622.68,503.39 631.47,486.84 640.26,496.75 649.05,442.72 657.84,448.12 666.62,494.63 675.41,480.11 684.20,504.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,441.45 613.89,501.30 622.68,466.74 631.47,497.94 640.26,515.00 649.05,443.54 657.84,454.54 666.62,431.73 675.41,441.84 684.20,485.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,470.95 613.89,459.20 622.68,453.12 631.47,475.08 640.26,494.38 649.05,450.48 657.84,450.61 666.62,470.25 675.41,492.29 684.20,493.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,452.40 613.89,471.57 622.68,470.93 631.47,488.65 640.26,485.72 649.05,392.87 657.84,379.99 666.62,361.12 675.41,367.92 684.20,423.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,484.74 613.89,426.58 622.68,501.65 631.47,437.86 640.26,497.99 649.05,443.31 657.84,399.81 666.62,419.93 675.41,400.51 684.20,474.73 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,471.02 613.89,466.27 622.68,503.27 631.47,493.61 640.26,511.36 649.05,478.37 657.84,446.38 666.62,483.40 675.41,479.86 684.20,501.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,438.41 613.89,453.25 622.68,454.32 631.47,442.99 640.26,494.16 649.05,436.37 657.84,392.82 666.62,380.97 675.41,324.60 684.20,480.59 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,473.27 613.89,481.58 622.68,504.61 631.47,488.38 640.26,499.71 649.05,459.60 657.84,505.39 666.62,477.27 675.41,486.44 684.20,498.46 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,393.71 613.89,463.38 622.68,462.16 631.47,491.12 640.26,502.82 649.05,410.25 657.84,477.65 666.62,436.69 675.41,474.59 684.20,418.84 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,462.73 613.89,434.45 622.68,464.83 631.47,464.70 640.26,497.62 649.05,418.61 657.84,344.86 666.62,462.58 675.41,371.53 684.20,466.92 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,382.56 613.89,432.95 622.68,476.45 631.47,462.26 640.26,480.04 649.05,381.12 657.84,374.62 666.62,442.14 675.41,446.33 684.20,447.92 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,486.01 613.89,502.22 622.68,495.10 631.47,503.24 640.26,501.58 649.05,413.78 657.84,479.49 666.62,459.65 675.41,486.39 684.20,507.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,460.94 613.89,454.32 622.68,503.19 631.47,492.54 640.26,480.24 649.05,415.70 657.84,403.13 666.62,431.88 675.41,491.54 684.20,449.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,460.62 613.89,479.19 622.68,493.06 631.47,506.61 640.26,519.93 649.05,456.73 657.84,481.76 666.62,478.72 675.41,490.40 684.20,506.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,484.79 613.89,487.96 622.68,490.77 631.47,501.55 640.26,509.62 649.05,483.95 657.84,506.21 666.62,489.55 675.41,510.41 684.20,502.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,489.80 613.89,435.82 622.68,471.75 631.47,476.50 640.26,487.78 649.05,336.65 657.84,392.52 666.62,401.18 675.41,420.68 684.20,467.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,451.21 613.89,483.28 622.68,492.81 631.47,479.94 640.26,490.60 649.05,445.30 657.84,478.99 666.62,430.64 675.41,471.55 684.20,468.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,402.45 613.89,484.42 622.68,444.21 631.47,464.90 640.26,472.15 649.05,422.20 657.84,395.23 666.62,345.73 675.41,467.14 684.20,400.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,452.70 613.89,490.20 622.68,477.65 631.47,472.84 640.26,482.65 649.05,433.93 657.84,408.23 666.62,419.93 675.41,415.90 684.20,404.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,473.74 613.89,454.59 622.68,488.75 631.47,414.28 640.26,474.86 649.05,347.75 657.84,389.38 666.62,412.26 675.41,403.67 684.20,442.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,447.67 613.89,441.99 622.68,404.84 631.47,425.06 640.26,404.27 649.05,350.56 657.84,321.51 666.62,292.63 675.41,376.19 684.20,423.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,429.15 613.89,469.76 622.68,499.41 631.47,504.07 640.26,483.85 649.05,467.36 657.84,489.33 666.62,464.25 675.41,420.53 684.20,505.58 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,366.55 613.89,444.33 622.68,492.96 631.47,447.25 640.26,460.17 649.05,372.05 657.84,431.78 666.62,409.20 675.41,426.43 684.20,473.94 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,479.91 613.89,422.12 622.68,379.02 631.47,380.74 640.26,461.07 649.05,230.30 657.84,46.53 666.62,198.81 675.41,90.35 684.20,163.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,472.74 613.89,452.08 622.68,465.55 631.47,467.69 640.26,494.93 649.05,379.82 657.84,401.21 666.62,400.11 675.41,406.21 684.20,465.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,398.37 613.89,468.14 622.68,369.31 631.47,398.94 640.26,457.33 649.05,170.90 657.84,337.87 666.62,402.25 675.41,313.96 684.20,365.75 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,455.21 613.89,422.55 622.68,470.65 631.47,452.77 640.26,483.28 649.05,427.30 657.84,323.77 666.62,358.18 675.41,402.13 684.20,450.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,489.57 613.89,477.57 622.68,472.49 631.47,468.44 640.26,501.77 649.05,422.45 657.84,434.85 666.62,390.53 675.41,412.09 684.20,425.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,442.89 613.89,488.95 622.68,480.31 631.47,448.67 640.26,507.35 649.05,351.88 657.84,453.97 666.62,471.22 675.41,491.52 684.20,481.98 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,486.39 613.89,487.26 622.68,490.25 631.47,507.83 640.26,514.62 649.05,440.65 657.84,466.59 666.62,465.32 675.41,488.58 684.20,491.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,472.74 613.89,458.60 622.68,478.22 631.47,512.93 640.26,502.00 649.05,448.77 657.84,442.94 666.62,456.76 675.41,444.06 684.20,489.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,459.80 613.89,452.18 622.68,465.32 631.47,493.46 640.26,509.97 649.05,457.83 657.84,458.65 666.62,456.66 675.41,468.41 684.20,508.02 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,420.13 613.89,473.79 622.68,464.13 631.47,465.42 640.26,480.21 649.05,398.94 657.84,430.34 666.62,443.89 675.41,484.99 684.20,480.54 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,455.49 613.89,464.95 622.68,444.58 631.47,478.57 640.26,475.13 649.05,375.96 657.84,442.96 666.62,459.85 675.41,450.23 684.20,506.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,392.12 613.89,463.01 622.68,486.86 631.47,486.64 640.26,463.28 649.05,408.65 657.84,415.23 666.62,452.43 675.41,434.62 684.20,457.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,479.44 613.89,493.14 622.68,499.16 631.47,501.45 640.26,490.50 649.05,415.28 657.84,453.84 666.62,482.08 675.41,489.62 684.20,506.56 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,468.91 613.89,444.73 622.68,463.65 631.47,494.50 640.26,475.08 649.05,408.93 657.84,463.93 666.62,461.94 675.41,448.67 684.20,491.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,473.56 613.89,500.95 622.68,494.31 631.47,503.32 640.26,508.92 649.05,446.72 657.84,462.66 666.62,507.33 675.41,509.82 684.20,512.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,428.95 613.89,444.66 622.68,455.49 631.47,488.63 640.26,481.86 649.05,376.78 657.84,393.59 666.62,370.18 675.41,397.87 684.20,449.41 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,438.91 613.89,465.17 622.68,389.93 631.47,463.75 640.26,461.34 649.05,412.24 657.84,449.84 666.62,336.10 675.41,407.88 684.20,389.68 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,460.07 613.89,484.32 622.68,503.39 631.47,495.65 640.26,498.51 649.05,432.56 657.84,429.49 666.62,427.23 675.41,483.70 684.20,507.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,460.57 613.89,503.27 622.68,487.76 631.47,492.81 640.26,485.57 649.05,482.03 657.84,486.14 666.62,495.97 675.41,503.32 684.20,504.59 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,461.12 613.89,453.57 622.68,491.52 631.47,488.13 640.26,500.70 649.05,420.18 657.84,433.75 666.62,415.82 675.41,504.24 684.20,490.60 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,468.98 613.89,481.23 622.68,506.73 631.47,498.66 640.26,494.58 649.05,474.39 657.84,464.50 666.62,476.75 675.41,465.35 684.20,489.38 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,488.73 613.89,473.71 622.68,505.73 631.47,499.66 640.26,513.30 649.05,457.63 657.84,486.31 666.62,487.41 675.41,490.22 684.20,502.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,466.59 613.89,487.91 622.68,485.81 631.47,490.79 640.26,497.49 649.05,432.88 657.84,484.10 666.62,450.21 675.41,459.40 684.20,486.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,457.43 613.89,465.62 622.68,484.40 631.47,463.75 640.26,497.49 649.05,414.80 657.84,399.64 666.62,436.76 675.41,485.39 684.20,475.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,444.36 613.89,485.39 622.68,483.60 631.47,463.26 640.26,469.28 649.05,346.76 657.84,420.48 666.62,395.86 675.41,448.59 684.20,461.02 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,469.66 613.89,450.13 622.68,471.37 631.47,483.95 640.26,487.43 649.05,422.52 657.84,347.10 666.62,426.85 675.41,440.97 684.20,439.90 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,441.15 613.89,445.68 622.68,459.12 631.47,504.64 640.26,496.99 649.05,384.35 657.84,404.62 666.62,445.73 675.41,400.21 684.20,469.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,488.13 613.89,416.89 622.68,457.55 631.47,465.60 640.26,475.33 649.05,374.34 657.84,376.56 666.62,412.19 675.41,413.48 684.20,435.69 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,478.57 613.89,488.75 622.68,482.28 631.47,461.54 640.26,497.82 649.05,374.27 657.84,380.42 666.62,379.12 675.41,434.00 684.20,451.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,420.48 613.89,485.94 622.68,495.48 631.47,500.70 640.26,494.40 649.05,464.58 657.84,462.91 666.62,401.26 675.41,476.35 684.20,505.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,467.79 613.89,487.06 622.68,481.83 631.47,497.44 640.26,490.84 649.05,423.82 657.84,485.02 666.62,441.87 675.41,432.86 684.20,433.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,466.87 613.89,421.00 622.68,481.76 631.47,470.28 640.26,459.05 649.05,375.24 657.84,432.66 666.62,444.16 675.41,440.80 684.20,452.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,442.49 613.89,416.17 622.68,414.55 631.47,410.50 640.26,389.08 649.05,336.20 657.84,162.21 666.62,331.37 675.41,342.90 684.20,161.81 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,447.60 613.89,439.08 622.68,437.39 631.47,498.69 640.26,491.59 649.05,414.70 657.84,417.52 666.62,429.89 675.41,431.49 684.20,463.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,452.38 613.89,440.42 622.68,456.88 631.47,494.85 640.26,483.40 649.05,374.17 657.84,359.75 666.62,377.13 675.41,449.89 684.20,455.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,487.16 613.89,432.78 622.68,485.94 631.47,484.74 640.26,500.73 649.05,462.91 657.84,388.88 666.62,478.67 675.41,470.45 684.20,471.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,470.15 613.89,489.65 622.68,478.59 631.47,462.43 640.26,461.17 649.05,424.79 657.84,444.98 666.62,441.20 675.41,473.09 684.20,487.63 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,427.55 613.89,426.46 622.68,467.94 631.47,475.78 640.26,463.31 649.05,379.57 657.84,436.24 666.62,446.50 675.41,431.44 684.20,460.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,487.63 613.89,477.05 622.68,480.56 631.47,488.48 640.26,485.67 649.05,396.50 657.84,471.42 666.62,495.28 675.41,474.49 684.20,461.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,418.12 613.89,413.11 622.68,426.63 631.47,422.82 640.26,452.72 649.05,383.83 657.84,385.55 666.62,317.10 675.41,373.10 684.20,435.72 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,399.59 613.89,490.72 622.68,459.97 631.47,457.75 640.26,491.12 649.05,345.73 657.84,399.89 666.62,351.29 675.41,367.22 684.20,451.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,440.77 613.89,484.64 622.68,428.32 631.47,408.11 640.26,456.93 649.05,397.30 657.84,370.09 666.62,367.05 675.41,440.10 684.20,411.47 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,442.64 613.89,421.97 622.68,460.12 631.47,481.61 640.26,473.12 649.05,283.59 657.84,434.55 666.62,413.56 675.41,387.86 684.20,451.08 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,498.66 613.89,489.30 622.68,472.34 631.47,495.95 640.26,493.63 649.05,434.42 657.84,455.14 666.62,454.14 675.41,489.50 684.20,468.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,420.43 613.89,472.17 622.68,450.16 631.47,461.81 640.26,428.12 649.05,294.12 657.84,382.14 666.62,401.51 675.41,355.69 684.20,426.58 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,450.58 613.89,449.24 622.68,479.54 631.47,448.96 640.26,480.51 649.05,400.56 657.84,343.47 666.62,355.22 675.41,392.77 684.20,447.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,427.60 613.89,498.04 622.68,498.61 631.47,483.82 640.26,509.77 649.05,451.11 657.84,486.59 666.62,468.98 675.41,485.02 684.20,502.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,415.97 613.89,418.89 622.68,508.75 631.47,472.72 640.26,493.91 649.05,370.01 657.84,415.28 666.62,478.77 675.41,381.41 684.20,440.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,421.97 613.89,472.72 622.68,473.27 631.47,442.94 640.26,467.46 649.05,120.45 657.84,262.50 666.62,400.76 675.41,465.90 684.20,376.06 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,418.31 613.89,420.78 622.68,474.64 631.47,468.51 640.26,472.72 649.05,390.48 657.84,441.79 666.62,300.84 675.41,206.75 684.20,434.97 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,477.45 613.89,433.95 622.68,485.91 631.47,462.91 640.26,469.58 649.05,380.39 657.84,335.90 666.62,447.89 675.41,395.98 684.20,446.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,489.82 613.89,470.63 622.68,457.46 631.47,489.97 640.26,506.06 649.05,415.85 657.84,455.66 666.62,479.17 675.41,464.25 684.20,478.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,453.89 613.89,483.37 622.68,472.87 631.47,496.12 640.26,497.52 649.05,391.52 657.84,364.91 666.62,463.41 675.41,435.12 684.20,445.30 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,389.71 613.89,473.02 622.68,479.22 631.47,497.14 640.26,501.70 649.05,412.14 657.84,397.92 666.62,490.22 675.41,432.41 684.20,473.81 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,442.14 613.89,447.12 622.68,455.89 631.47,478.37 640.26,450.36 649.05,277.91 657.84,264.69 666.62,260.78 675.41,308.71 684.20,323.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,458.85 613.89,462.71 622.68,482.48 631.47,451.93 640.26,493.56 649.05,434.25 657.84,378.80 666.62,463.93 675.41,437.61 684.20,451.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='605.10,475.23 613.89,472.07 622.68,466.99 631.47,472.42 640.26,500.06 649.05,423.72 657.84,408.11 666.62,462.21 675.41,481.16 684.20,440.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<rect x='47.48' y='22.78' width='667.04' height='522.33' style='stroke-width: 1.07; stroke: #333333;' /> </g> <g clip-path='url(#cpMC4wMHw3MjAuMDB8MC4wMHw1NzYuMDA=)'> -<text x='37.65' y='483.84' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='14.68px' lengthAdjust='spacingAndGlyphs'>500</text> -<text x='37.65' y='376.56' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>1000</text> -<text x='37.65' y='269.27' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>1500</text> -<text x='37.65' y='161.99' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>2000</text> -<text x='37.65' y='54.70' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>2500</text> -<polyline points='39.84,480.82 42.58,480.82 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='39.84,373.53 42.58,373.53 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='39.84,266.25 42.58,266.25 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='39.84,158.96 42.58,158.96 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='39.84,51.68 42.58,51.68 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='46.82,547.85 46.82,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='312.79,547.85 312.79,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='581.68,547.85 581.68,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<text x='46.82' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='13.70px' lengthAdjust='spacingAndGlyphs'>Apr</text> -<text x='312.79' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='11.25px' lengthAdjust='spacingAndGlyphs'>Jul</text> -<text x='581.68' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='13.70px' lengthAdjust='spacingAndGlyphs'>Oct</text> -<text x='378.55' y='568.24' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='75.23px' lengthAdjust='spacingAndGlyphs'>Reference date</text> +<text x='42.55' y='534.21' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='4.89px' lengthAdjust='spacingAndGlyphs'>0</text> +<text x='42.55' y='409.71' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>5000</text> +<text x='42.55' y='285.22' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='24.47px' lengthAdjust='spacingAndGlyphs'>10000</text> +<text x='42.55' y='160.73' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='24.47px' lengthAdjust='spacingAndGlyphs'>15000</text> +<text x='42.55' y='36.23' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='24.47px' lengthAdjust='spacingAndGlyphs'>20000</text> +<polyline points='44.74,531.18 47.48,531.18 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,406.69 47.48,406.69 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,282.19 47.48,282.19 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,157.70 47.48,157.70 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,33.20 47.48,33.20 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='121.74,547.85 121.74,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='244.78,547.85 244.78,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='367.82,547.85 367.82,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='517.22,547.85 517.22,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='640.26,547.85 640.26,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<text x='121.74' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.40px' lengthAdjust='spacingAndGlyphs'>Feb 15</text> +<text x='244.78' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 01</text> +<text x='367.82' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 15</text> +<text x='517.22' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='25.93px' lengthAdjust='spacingAndGlyphs'>Apr 01</text> +<text x='640.26' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='25.93px' lengthAdjust='spacingAndGlyphs'>Apr 15</text> +<text x='381.00' y='568.24' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='75.23px' lengthAdjust='spacingAndGlyphs'>Reference date</text> <text transform='translate(13.05,283.95) rotate(-90)' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='31.19px' lengthAdjust='spacingAndGlyphs'>Cases</text> -<text x='42.58' y='14.56' style='font-size: 13.20px; font-family: sans;' textLength='46.97px' lengthAdjust='spacingAndGlyphs'>forecast</text> +<text x='47.48' y='14.56' style='font-size: 13.20px; font-family: sans;' textLength='46.97px' lengthAdjust='spacingAndGlyphs'>forecast</text> </g> </svg> diff --git a/tests/testthat/_snaps/plot/obs-cases.svg b/tests/testthat/_snaps/plot/obs-cases.svg index 705e71c..bb9b244 100644 --- a/tests/testthat/_snaps/plot/obs-cases.svg +++ b/tests/testthat/_snaps/plot/obs-cases.svg @@ -21,337 +21,213 @@ <rect x='0.00' y='0.00' width='720.00' height='576.00' style='stroke-width: 1.07; stroke: #FFFFFF; fill: #FFFFFF;' /> </g> <defs> - <clipPath id='cpNDIuNTh8NzE0LjUyfDIyLjc4fDU0NS4xMQ=='> - <rect x='42.58' y='22.78' width='671.94' height='522.33' /> + <clipPath id='cpNDcuNDh8NzE0LjUyfDIyLjc4fDU0NS4xMQ=='> + <rect x='47.48' y='22.78' width='667.04' height='522.33' /> </clipPath> </defs> -<g clip-path='url(#cpNDIuNTh8NzE0LjUyfDIyLjc4fDU0NS4xMQ==)'> -<rect x='42.58' y='22.78' width='671.94' height='522.33' style='stroke-width: 1.07; stroke: none; fill: #FFFFFF;' /> -<polyline points='42.58,494.48 714.52,494.48 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,286.03 714.52,286.03 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,77.58 714.52,77.58 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='185.17,545.11 185.17,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='466.04,545.11 466.04,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,390.26 714.52,390.26 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='42.58,181.81 714.52,181.81 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='45.50,545.11 45.50,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='324.83,545.11 324.83,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='607.24,545.11 607.24,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<circle cx='73.13' cy='127.61' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='76.19' cy='132.61' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='79.26' cy='124.28' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='82.33' cy='123.03' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='85.40' cy='131.99' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='88.47' cy='113.85' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='91.54' cy='131.36' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='94.61' cy='129.07' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='97.68' cy='87.38' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='100.75' cy='111.77' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='103.82' cy='106.77' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='106.89' cy='99.05' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='109.96' cy='111.14' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='113.03' cy='88.42' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='116.10' cy='109.69' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='119.17' cy='117.19' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='122.24' cy='117.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='125.31' cy='124.28' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='128.38' cy='106.77' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='131.45' cy='86.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='134.52' cy='105.10' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='137.59' cy='107.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='140.66' cy='104.68' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='143.73' cy='96.76' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='146.80' cy='111.14' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='149.87' cy='85.09' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='152.94' cy='96.97' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='156.00' cy='74.67' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='159.07' cy='86.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='162.14' cy='91.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='165.21' cy='83.00' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='168.28' cy='85.09' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='171.35' cy='97.60' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='174.42' cy='88.22' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='177.49' cy='78.84' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='180.56' cy='78.63' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='183.63' cy='74.04' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='186.70' cy='72.58' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='189.77' cy='88.01' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='192.84' cy='86.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='195.91' cy='99.26' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='198.98' cy='74.04' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='202.05' cy='88.42' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='205.12' cy='91.97' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='208.19' cy='82.38' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='211.26' cy='74.67' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='214.33' cy='87.80' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='217.40' cy='94.47' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='220.47' cy='82.80' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='223.54' cy='87.59' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='226.61' cy='83.00' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='229.68' cy='89.26' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='232.75' cy='98.43' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='235.81' cy='95.30' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='238.88' cy='101.76' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='241.95' cy='110.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='245.02' cy='95.51' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='248.09' cy='118.65' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='251.16' cy='101.35' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='254.23' cy='111.98' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='257.30' cy='106.14' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='260.37' cy='127.20' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='263.44' cy='135.12' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='266.51' cy='116.15' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='269.58' cy='109.89' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='272.65' cy='129.90' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='275.72' cy='115.94' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='278.79' cy='128.03' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='281.86' cy='129.49' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='284.93' cy='145.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='288.00' cy='136.99' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='291.07' cy='143.04' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='294.14' cy='163.26' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='297.21' cy='163.05' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='300.28' cy='181.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='303.35' cy='161.17' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='306.42' cy='165.34' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='309.49' cy='173.89' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='312.56' cy='162.42' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='315.62' cy='191.40' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='318.69' cy='174.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='321.76' cy='197.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='324.83' cy='193.69' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='327.90' cy='196.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='330.97' cy='203.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='334.04' cy='213.91' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='337.11' cy='212.87' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='340.18' cy='226.42' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='343.25' cy='234.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='346.32' cy='209.53' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='349.39' cy='215.79' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='352.46' cy='220.79' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='355.53' cy='223.08' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='358.60' cy='234.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='361.67' cy='256.85' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='364.74' cy='246.43' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='367.81' cy='246.22' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='370.88' cy='263.52' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='373.95' cy='274.15' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='377.02' cy='259.77' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='380.09' cy='261.85' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='383.16' cy='264.35' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='386.23' cy='265.19' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='389.30' cy='270.61' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='392.36' cy='289.16' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='395.43' cy='280.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='398.50' cy='294.79' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='401.57' cy='284.78' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='404.64' cy='300.21' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='407.71' cy='305.21' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='410.78' cy='301.04' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='413.85' cy='309.59' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='416.92' cy='314.38' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='419.99' cy='310.42' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='423.06' cy='318.76' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='426.13' cy='325.01' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='429.20' cy='329.18' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='432.27' cy='345.02' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='435.34' cy='331.27' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='438.41' cy='344.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='441.48' cy='342.94' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='444.55' cy='369.20' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='447.62' cy='356.28' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='450.69' cy='354.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='453.76' cy='362.53' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='456.83' cy='364.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='459.90' cy='355.65' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='462.97' cy='370.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='466.04' cy='372.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='469.11' cy='374.00' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='472.17' cy='371.91' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='475.24' cy='385.05' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='478.31' cy='376.71' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='481.38' cy='375.46' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='484.45' cy='382.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='487.52' cy='389.01' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='490.59' cy='388.38' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='493.66' cy='382.75' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='496.73' cy='394.63' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='499.80' cy='394.84' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='502.87' cy='405.89' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='505.94' cy='401.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='509.01' cy='393.17' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='512.08' cy='410.06' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='515.15' cy='413.81' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='518.22' cy='404.43' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='521.29' cy='408.60' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='524.36' cy='409.43' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='527.43' cy='411.94' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='530.50' cy='424.23' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='533.57' cy='413.19' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='536.64' cy='429.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='539.71' cy='425.69' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='542.78' cy='431.95' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='545.85' cy='431.74' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='548.92' cy='428.19' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='551.98' cy='433.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='555.05' cy='431.95' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='558.12' cy='445.29' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='561.19' cy='451.54' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='564.26' cy='435.28' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='567.33' cy='442.37' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='570.40' cy='449.46' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='573.47' cy='448.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='576.54' cy='448.83' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='579.61' cy='461.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='582.68' cy='454.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='585.75' cy='460.92' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='588.82' cy='462.38' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='591.89' cy='461.34' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='594.96' cy='461.34' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='598.03' cy='469.47' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='601.10' cy='459.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='604.17' cy='476.14' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='607.24' cy='474.47' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='610.31' cy='476.76' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='613.38' cy='481.35' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='616.45' cy='478.22' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='619.52' cy='481.77' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='622.59' cy='478.43' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='625.66' cy='491.35' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='628.72' cy='490.10' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='631.79' cy='489.06' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='634.86' cy='484.68' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='637.93' cy='488.64' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='641.00' cy='495.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='644.07' cy='493.65' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='647.14' cy='487.18' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='650.21' cy='497.40' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='653.28' cy='500.11' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='656.35' cy='498.65' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='659.42' cy='497.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='662.49' cy='501.57' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='665.56' cy='500.53' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='668.63' cy='506.78' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='671.70' cy='502.61' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='674.77' cy='505.11' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='677.84' cy='512.82' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='680.91' cy='509.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<circle cx='683.98' cy='505.32' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> -<polyline points='73.13,120.11 76.19,124.90 79.26,117.61 82.33,104.68 85.40,115.94 88.47,125.32 91.54,119.90 94.61,126.15 97.68,120.32 100.75,94.68 103.82,111.77 106.89,102.60 109.96,88.63 113.03,105.72 116.10,110.52 119.17,101.97 122.24,128.86 125.31,94.47 128.38,115.94 131.45,93.22 134.52,78.42 137.59,93.01 140.66,98.22 143.73,71.54 146.80,92.38 149.87,83.00 152.94,109.89 156.00,78.63 159.07,89.47 162.14,71.54 165.21,79.25 168.28,96.76 171.35,81.13 174.42,90.30 177.49,67.79 180.56,89.67 183.63,76.33 186.70,66.75 189.77,96.76 192.84,111.98 195.91,74.25 198.98,79.88 202.05,93.43 205.12,92.59 208.19,101.97 211.26,89.88 214.33,83.21 217.40,74.67 220.47,76.13 223.54,75.08 226.61,74.46 229.68,115.73 232.75,86.55 235.81,109.69 238.88,104.47 241.95,100.31 245.02,95.72 248.09,121.57 251.16,98.64 254.23,101.56 257.30,129.07 260.37,110.31 263.44,119.90 266.51,119.27 269.58,118.02 272.65,130.11 275.72,121.98 278.79,125.53 281.86,129.90 284.93,135.32 288.00,135.74 291.07,143.25 294.14,149.08 297.21,164.72 300.28,166.59 303.35,150.96 306.42,170.76 309.49,178.47 312.56,185.98 315.62,174.10 318.69,189.10 321.76,197.44 324.83,187.02 327.90,214.95 330.97,205.99 334.04,215.58 337.11,216.62 340.18,210.78 343.25,210.78 346.32,245.59 349.39,252.47 352.46,235.38 355.53,243.09 358.60,247.89 361.67,237.05 364.74,245.18 367.81,249.35 370.88,253.93 373.95,248.51 377.02,253.31 380.09,267.90 383.16,274.15 386.23,262.06 389.30,269.15 392.36,282.28 395.43,276.86 398.50,287.91 401.57,284.16 404.64,291.66 407.71,302.08 410.78,303.96 413.85,303.54 416.92,316.26 419.99,330.01 423.06,327.51 426.13,324.18 429.20,336.27 432.27,338.35 435.34,336.27 438.41,351.69 441.48,332.10 444.55,366.28 447.62,345.23 450.69,347.32 453.76,360.87 456.83,361.91 459.90,362.95 462.97,370.45 466.04,374.21 469.11,374.62 472.17,388.59 475.24,373.37 478.31,385.67 481.38,378.58 484.45,380.67 487.52,395.88 490.59,385.05 493.66,392.55 496.73,385.05 499.80,386.50 502.87,414.44 505.94,400.68 509.01,397.34 512.08,402.55 515.15,404.22 518.22,421.52 521.29,413.19 524.36,412.35 527.43,415.06 530.50,420.48 533.57,431.74 536.64,429.24 539.71,422.57 542.78,432.36 545.85,423.40 548.92,439.24 551.98,423.40 555.05,433.41 558.12,440.49 561.19,445.91 564.26,443.83 567.33,449.25 570.40,448.41 573.47,455.29 576.54,450.50 579.61,455.92 582.68,454.88 585.75,465.51 588.82,463.21 591.89,459.46 594.96,465.71 598.03,474.47 601.10,474.05 604.17,470.09 607.24,470.72 610.31,484.47 613.38,467.59 616.45,476.55 619.52,480.31 622.59,483.43 625.66,479.68 628.72,491.56 631.79,493.65 634.86,492.81 637.93,495.94 641.00,493.44 644.07,500.11 647.14,498.23 650.21,494.90 653.28,496.77 656.35,493.23 659.42,494.06 662.49,500.73 665.56,504.90 668.63,503.86 671.70,504.49 674.77,504.69 677.84,506.15 680.91,506.78 683.98,501.98 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,131.57 76.19,136.16 79.26,97.39 82.33,91.55 85.40,126.99 88.47,114.69 91.54,111.56 94.61,118.02 97.68,125.11 100.75,109.89 103.82,107.60 106.89,113.65 109.96,109.06 113.03,129.70 116.10,114.06 119.17,89.47 122.24,97.18 125.31,108.64 128.38,116.15 131.45,89.47 134.52,111.56 137.59,105.93 140.66,103.43 143.73,85.51 146.80,108.64 149.87,108.64 152.94,92.38 156.00,99.68 159.07,94.26 162.14,76.96 165.21,79.88 168.28,84.46 171.35,80.50 174.42,81.96 177.49,96.14 180.56,74.46 183.63,98.22 186.70,108.43 189.77,57.36 192.84,86.13 195.91,83.84 198.98,90.72 202.05,80.09 205.12,90.72 208.19,81.13 211.26,79.67 214.33,84.05 217.40,94.68 220.47,88.84 223.54,96.14 226.61,87.38 229.68,105.31 232.75,92.18 235.81,83.42 238.88,93.01 241.95,108.02 245.02,100.93 248.09,107.18 251.16,94.26 254.23,127.40 257.30,107.18 260.37,122.82 263.44,116.98 266.51,138.45 269.58,124.49 272.65,139.70 275.72,110.73 278.79,132.41 281.86,132.82 284.93,138.87 288.00,126.78 291.07,163.47 294.14,155.96 297.21,159.50 300.28,167.22 303.35,148.67 306.42,152.83 309.49,169.09 312.56,175.76 315.62,195.36 318.69,183.68 321.76,162.21 324.83,188.48 327.90,196.40 330.97,200.78 334.04,202.44 337.11,217.24 340.18,203.07 343.25,223.71 346.32,236.63 349.39,231.00 352.46,224.96 355.53,227.67 358.60,241.01 361.67,240.59 364.74,264.15 367.81,253.51 370.88,260.81 373.95,255.60 377.02,262.69 380.09,272.48 383.16,277.69 386.23,256.43 389.30,285.41 392.36,291.87 395.43,286.03 398.50,302.50 401.57,288.95 404.64,280.82 407.71,289.78 410.78,320.43 413.85,305.63 416.92,308.75 419.99,321.26 423.06,329.18 426.13,319.59 429.20,344.61 432.27,329.60 435.34,331.27 438.41,338.14 441.48,345.44 444.55,332.10 447.62,354.19 450.69,350.03 453.76,348.36 456.83,376.08 459.90,365.66 462.97,369.83 466.04,371.70 469.11,369.62 472.17,377.75 475.24,376.08 478.31,383.17 481.38,384.63 484.45,387.55 487.52,381.08 490.59,384.21 493.66,394.43 496.73,400.68 499.80,411.73 502.87,398.39 505.94,390.46 509.01,397.97 512.08,405.26 515.15,412.14 518.22,410.89 521.29,419.65 524.36,418.81 527.43,420.48 530.50,424.65 533.57,423.40 536.64,419.44 539.71,418.40 542.78,426.73 545.85,431.32 548.92,431.53 551.98,440.70 555.05,438.41 558.12,442.58 561.19,455.08 564.26,431.53 567.33,445.70 570.40,439.66 573.47,452.79 576.54,448.00 579.61,457.79 582.68,461.75 585.75,456.13 588.82,462.80 591.89,455.08 594.96,454.25 598.03,460.92 601.10,461.55 604.17,477.39 607.24,468.01 610.31,474.47 613.38,475.09 616.45,482.18 619.52,481.14 622.59,476.14 625.66,491.35 628.72,480.51 631.79,488.23 634.86,494.48 637.93,492.60 641.00,492.81 644.07,493.65 647.14,499.48 650.21,497.40 653.28,499.48 656.35,494.69 659.42,495.31 662.49,505.32 665.56,503.65 668.63,509.07 671.70,513.03 674.77,507.20 677.84,500.11 680.91,504.07 683.98,509.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,105.93 76.19,129.49 79.26,138.45 82.33,111.35 85.40,107.81 88.47,109.89 91.54,108.43 94.61,125.53 97.68,111.98 100.75,120.52 103.82,106.98 106.89,108.64 109.96,116.56 113.03,118.02 116.10,91.34 119.17,102.60 122.24,111.56 125.31,116.77 128.38,118.65 131.45,110.52 134.52,115.52 137.59,96.34 140.66,108.64 143.73,106.98 146.80,96.55 149.87,87.80 152.94,96.14 156.00,103.85 159.07,71.54 162.14,75.08 165.21,72.37 168.28,77.17 171.35,73.62 174.42,67.79 177.49,76.13 180.56,89.47 183.63,70.08 186.70,77.38 189.77,76.33 192.84,74.46 195.91,72.79 198.98,85.30 202.05,72.37 205.12,70.91 208.19,78.00 211.26,82.80 214.33,81.54 217.40,88.01 220.47,89.88 223.54,85.30 226.61,73.42 229.68,83.63 232.75,87.17 235.81,91.97 238.88,123.03 241.95,90.30 245.02,94.26 248.09,123.65 251.16,125.74 254.23,95.30 257.30,101.97 260.37,131.16 263.44,120.73 266.51,116.15 269.58,124.07 272.65,133.24 275.72,136.78 278.79,128.24 281.86,135.53 284.93,133.03 288.00,154.29 291.07,164.92 294.14,146.16 297.21,150.54 300.28,164.30 303.35,167.43 306.42,191.81 309.49,189.73 312.56,181.18 315.62,185.35 318.69,201.40 321.76,199.11 324.83,203.90 327.90,191.19 330.97,201.82 334.04,196.82 337.11,207.86 340.18,226.21 343.25,215.99 346.32,203.70 349.39,238.51 352.46,228.92 355.53,229.96 358.60,240.17 361.67,242.88 364.74,258.52 367.81,247.47 370.88,254.56 373.95,257.68 377.02,258.73 380.09,272.07 383.16,282.70 386.23,268.31 389.30,277.69 392.36,272.69 395.43,288.53 398.50,288.74 401.57,303.13 404.64,296.87 407.71,298.33 410.78,326.89 413.85,320.63 416.92,323.34 419.99,316.88 423.06,327.72 426.13,321.89 429.20,333.77 432.27,340.44 435.34,336.06 438.41,339.60 441.48,351.49 444.55,366.49 447.62,366.70 450.69,362.74 453.76,364.83 456.83,368.16 459.90,384.42 462.97,356.70 466.04,366.91 469.11,362.12 472.17,370.66 475.24,374.62 478.31,377.75 481.38,377.75 484.45,383.59 487.52,391.72 490.59,390.88 493.66,391.09 496.73,393.59 499.80,385.67 502.87,398.59 505.94,397.97 509.01,400.05 512.08,413.39 515.15,416.10 518.22,413.39 521.29,432.36 524.36,400.05 527.43,416.10 530.50,419.02 533.57,429.24 536.64,425.90 539.71,424.65 542.78,422.98 545.85,434.66 548.92,430.28 551.98,416.10 555.05,432.78 558.12,443.62 561.19,436.12 564.26,438.82 567.33,439.03 570.40,448.83 573.47,451.75 576.54,451.75 579.61,460.71 582.68,464.67 585.75,461.75 588.82,461.96 591.89,467.17 594.96,472.59 598.03,469.88 601.10,465.51 604.17,468.63 607.24,466.55 610.31,473.84 613.38,476.76 616.45,478.43 619.52,473.22 622.59,479.47 625.66,482.81 628.72,494.48 631.79,490.73 634.86,494.06 637.93,488.85 641.00,489.27 644.07,498.23 647.14,486.98 650.21,489.89 653.28,495.52 656.35,501.57 659.42,500.94 662.49,505.11 665.56,505.74 668.63,502.82 671.70,506.36 674.77,510.11 677.84,512.41 680.91,515.53 683.98,512.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,94.89 76.19,134.28 79.26,114.48 82.33,139.29 85.40,127.40 88.47,107.81 91.54,107.18 94.61,119.90 97.68,110.94 100.75,103.22 103.82,127.20 106.89,116.15 109.96,102.60 113.03,109.48 116.10,97.60 119.17,98.85 122.24,111.56 125.31,125.32 128.38,106.56 131.45,117.81 134.52,124.49 137.59,106.77 140.66,94.47 143.73,105.31 146.80,98.85 149.87,95.72 152.94,100.51 156.00,105.52 159.07,81.13 162.14,83.84 165.21,102.60 168.28,95.93 171.35,102.18 174.42,87.80 177.49,71.12 180.56,76.54 183.63,80.29 186.70,85.30 189.77,79.67 192.84,86.76 195.91,75.71 198.98,72.79 202.05,86.76 205.12,70.08 208.19,86.96 211.26,81.34 214.33,70.91 217.40,84.25 220.47,91.97 223.54,94.68 226.61,99.89 229.68,94.89 232.75,97.60 235.81,98.01 238.88,120.11 241.95,102.60 245.02,99.47 248.09,114.06 251.16,95.09 254.23,110.10 257.30,121.15 260.37,118.02 263.44,112.81 266.51,118.86 269.58,145.12 272.65,121.57 275.72,114.90 278.79,131.78 281.86,136.58 284.93,144.29 288.00,144.91 291.07,139.70 294.14,151.17 297.21,175.56 300.28,167.63 303.35,160.96 306.42,181.60 309.49,165.76 312.56,157.21 315.62,178.26 318.69,188.27 321.76,183.06 324.83,210.78 327.90,200.36 330.97,203.28 334.04,213.08 337.11,206.41 340.18,221.00 343.25,229.13 346.32,224.33 349.39,224.75 352.46,233.50 355.53,251.22 358.60,246.22 361.67,236.63 364.74,250.80 367.81,239.76 370.88,258.73 373.95,257.48 377.02,257.68 380.09,253.51 383.16,270.82 386.23,271.86 389.30,282.28 392.36,283.11 395.43,278.74 398.50,290.41 401.57,281.03 404.64,308.54 407.71,303.54 410.78,312.51 413.85,308.34 416.92,319.18 419.99,329.18 423.06,322.72 426.13,323.76 429.20,332.52 432.27,339.19 435.34,341.90 438.41,348.15 441.48,334.39 444.55,347.73 447.62,342.73 450.69,350.65 453.76,350.03 456.83,365.45 459.90,369.83 462.97,352.94 466.04,357.11 469.11,376.29 472.17,377.96 475.24,381.92 478.31,374.41 481.38,388.80 484.45,390.46 487.52,370.66 490.59,392.34 493.66,401.30 496.73,397.14 499.80,404.64 502.87,401.10 505.94,405.68 509.01,400.68 512.08,404.85 515.15,417.98 518.22,409.43 521.29,407.56 524.36,404.64 527.43,423.61 530.50,411.31 533.57,423.61 536.64,423.19 539.71,420.48 542.78,425.28 545.85,434.86 548.92,439.24 551.98,438.82 555.05,437.16 558.12,446.33 561.19,440.08 564.26,445.08 567.33,446.54 570.40,441.74 573.47,456.33 576.54,449.04 579.61,458.84 582.68,458.63 585.75,449.66 588.82,462.17 591.89,459.04 594.96,456.75 598.03,474.89 601.10,469.05 604.17,471.55 607.24,467.17 610.31,471.97 613.38,470.51 616.45,475.72 619.52,485.31 622.59,480.93 625.66,479.26 628.72,492.40 631.79,489.48 634.86,488.44 637.93,484.89 641.00,492.60 644.07,497.61 647.14,496.98 650.21,501.78 653.28,489.69 656.35,499.48 659.42,503.44 662.49,502.61 665.56,507.61 668.63,504.90 671.70,509.91 674.77,508.65 677.84,506.15 680.91,513.45 683.98,513.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,131.36 76.19,112.81 79.26,106.56 82.33,128.45 85.40,128.65 88.47,123.03 91.54,120.73 94.61,130.32 97.68,104.89 100.75,92.80 103.82,110.52 106.89,110.94 109.96,99.89 113.03,110.31 116.10,123.23 119.17,121.15 122.24,105.93 125.31,116.15 128.38,116.98 131.45,107.18 134.52,101.97 137.59,100.31 140.66,95.30 143.73,95.30 146.80,103.85 149.87,118.02 152.94,102.39 156.00,84.88 159.07,83.42 162.14,83.00 165.21,75.50 168.28,103.22 171.35,96.97 174.42,85.92 177.49,82.59 180.56,76.75 183.63,73.62 186.70,88.01 189.77,84.88 192.84,84.88 195.91,66.54 198.98,72.16 202.05,87.80 205.12,76.96 208.19,88.63 211.26,94.89 214.33,79.04 217.40,96.55 220.47,69.66 223.54,93.22 226.61,87.80 229.68,74.87 232.75,88.84 235.81,90.09 238.88,104.68 241.95,102.18 245.02,103.64 248.09,105.52 251.16,119.69 254.23,112.81 257.30,116.36 260.37,93.63 263.44,104.68 266.51,121.98 269.58,131.99 272.65,130.11 275.72,113.23 278.79,124.90 281.86,127.61 284.93,142.83 288.00,139.70 291.07,147.41 294.14,161.17 297.21,164.30 300.28,145.12 303.35,176.60 306.42,162.63 309.49,167.01 312.56,192.86 315.62,193.06 318.69,189.73 321.76,192.02 324.83,195.36 327.90,177.43 330.97,205.99 334.04,215.58 337.11,211.82 340.18,222.04 343.25,213.49 346.32,213.08 349.39,226.21 352.46,236.84 355.53,230.17 358.60,246.43 361.67,228.50 364.74,259.35 367.81,249.76 370.88,262.69 373.95,254.14 377.02,255.18 380.09,268.52 383.16,278.74 386.23,274.15 389.30,289.16 392.36,282.28 395.43,297.08 398.50,288.74 401.57,296.45 404.64,311.05 407.71,302.29 410.78,321.47 413.85,306.67 416.92,333.14 419.99,314.59 423.06,314.38 426.13,324.60 429.20,324.60 432.27,329.60 435.34,333.98 438.41,342.31 441.48,341.69 444.55,345.65 447.62,356.49 450.69,354.61 453.76,366.70 456.83,357.32 459.90,364.62 462.97,375.04 466.04,380.46 469.11,368.79 472.17,379.21 475.24,373.79 478.31,365.24 481.38,383.79 484.45,375.87 487.52,391.09 490.59,382.54 493.66,392.34 496.73,407.97 499.80,393.80 502.87,408.18 505.94,403.81 509.01,405.06 512.08,413.39 515.15,403.60 518.22,414.02 521.29,412.98 524.36,414.44 527.43,419.44 530.50,414.85 533.57,430.07 536.64,422.98 539.71,426.73 542.78,433.20 545.85,435.07 548.92,426.32 551.98,435.91 555.05,431.53 558.12,442.37 561.19,444.04 564.26,440.70 567.33,441.53 570.40,451.33 573.47,457.59 576.54,459.46 579.61,451.54 582.68,452.58 585.75,464.67 588.82,456.54 591.89,464.46 594.96,474.89 598.03,468.63 601.10,474.68 604.17,459.25 607.24,474.05 610.31,477.18 613.38,474.47 616.45,484.68 619.52,487.39 622.59,478.43 625.66,477.60 628.72,494.69 631.79,482.18 634.86,485.10 637.93,493.23 641.00,493.44 644.07,495.11 647.14,499.27 650.21,493.44 653.28,493.23 656.35,494.27 659.42,494.27 662.49,497.19 665.56,497.82 668.63,506.36 671.70,506.57 674.77,508.86 677.84,516.78 680.91,505.74 683.98,507.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,139.29 76.19,130.53 79.26,133.03 82.33,131.57 85.40,141.58 88.47,142.41 91.54,104.06 94.61,121.98 97.68,114.48 100.75,114.27 103.82,103.43 106.89,120.32 109.96,106.77 113.03,98.64 116.10,106.98 119.17,116.77 122.24,78.63 125.31,89.67 128.38,97.18 131.45,98.43 134.52,104.06 137.59,93.84 140.66,86.34 143.73,116.77 146.80,84.67 149.87,78.63 152.94,89.88 156.00,95.30 159.07,90.09 162.14,97.39 165.21,93.01 168.28,81.75 171.35,92.80 174.42,87.17 177.49,79.67 180.56,77.79 183.63,78.42 186.70,62.37 189.77,94.05 192.84,80.50 195.91,88.22 198.98,80.50 202.05,67.37 205.12,90.51 208.19,73.42 211.26,92.59 214.33,84.46 217.40,98.43 220.47,100.93 223.54,109.89 226.61,99.47 229.68,95.30 232.75,83.00 235.81,92.80 238.88,102.39 241.95,111.77 245.02,107.81 248.09,87.38 251.16,108.23 254.23,106.56 257.30,113.02 260.37,105.52 263.44,106.56 266.51,107.18 269.58,103.64 272.65,125.11 275.72,117.61 278.79,123.23 281.86,135.12 284.93,134.07 288.00,147.00 291.07,134.70 294.14,150.33 297.21,158.88 300.28,162.21 303.35,183.06 306.42,174.10 309.49,176.81 312.56,178.06 315.62,182.02 318.69,190.98 321.76,200.99 324.83,202.65 327.90,206.61 330.97,196.61 334.04,207.45 337.11,216.20 340.18,204.11 343.25,218.70 346.32,230.38 349.39,213.08 352.46,242.88 355.53,230.17 358.60,251.64 361.67,255.81 364.74,249.55 367.81,254.97 370.88,250.80 373.95,264.15 377.02,269.15 380.09,262.48 383.16,267.48 386.23,279.99 389.30,283.32 392.36,271.02 395.43,286.45 398.50,287.49 401.57,301.25 404.64,308.75 407.71,298.54 410.78,298.54 413.85,321.89 416.92,308.96 419.99,318.76 423.06,334.39 426.13,322.72 429.20,330.43 432.27,346.48 435.34,335.02 438.41,345.23 441.48,345.86 444.55,350.23 447.62,356.28 450.69,357.53 453.76,366.28 456.83,380.88 459.90,375.25 462.97,361.49 466.04,374.21 469.11,387.96 472.17,381.50 475.24,373.16 478.31,380.46 481.38,384.42 484.45,389.01 487.52,393.59 490.59,384.84 493.66,388.38 496.73,388.59 499.80,391.09 502.87,402.97 505.94,401.51 509.01,405.47 512.08,415.48 515.15,405.89 518.22,406.10 521.29,403.39 524.36,409.23 527.43,411.31 530.50,427.78 533.57,420.27 536.64,421.73 539.71,433.82 542.78,433.82 545.85,433.61 548.92,437.99 551.98,433.41 555.05,437.37 558.12,434.45 561.19,434.86 564.26,446.95 567.33,444.66 570.40,448.62 573.47,461.13 576.54,446.54 579.61,454.25 582.68,458.42 585.75,450.29 588.82,459.25 591.89,464.46 594.96,458.84 598.03,471.34 601.10,465.71 604.17,478.22 607.24,470.93 610.31,480.10 613.38,479.68 616.45,474.05 619.52,473.84 622.59,483.02 625.66,479.89 628.72,489.48 631.79,492.19 634.86,483.43 637.93,488.23 641.00,496.56 644.07,495.73 647.14,496.36 650.21,496.36 653.28,501.57 656.35,501.57 659.42,500.73 662.49,493.23 665.56,504.28 668.63,500.53 671.70,517.62 674.77,513.03 677.84,505.32 680.91,507.61 683.98,509.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,110.52 76.19,132.82 79.26,118.23 82.33,141.79 85.40,129.49 88.47,120.94 91.54,115.31 94.61,123.65 97.68,135.74 100.75,148.67 103.82,105.72 106.89,119.27 109.96,112.19 113.03,111.56 116.10,92.18 119.17,101.97 122.24,97.18 125.31,111.98 128.38,107.39 131.45,83.84 134.52,101.56 137.59,99.05 140.66,96.55 143.73,97.39 146.80,88.84 149.87,88.01 152.94,95.51 156.00,91.34 159.07,92.18 162.14,85.92 165.21,80.50 168.28,96.34 171.35,68.83 174.42,106.14 177.49,97.60 180.56,70.71 183.63,99.68 186.70,87.38 189.77,95.51 192.84,84.05 195.91,70.08 198.98,58.62 202.05,69.04 205.12,93.22 208.19,90.51 211.26,79.46 214.33,88.22 217.40,84.25 220.47,79.46 223.54,107.18 226.61,83.21 229.68,100.72 232.75,92.38 235.81,113.02 238.88,109.89 241.95,100.93 245.02,107.18 248.09,95.93 251.16,113.02 254.23,116.77 257.30,113.85 260.37,104.06 263.44,107.60 266.51,115.52 269.58,117.81 272.65,139.08 275.72,102.18 278.79,134.70 281.86,136.58 284.93,133.03 288.00,141.37 291.07,141.99 294.14,152.63 297.21,170.97 300.28,177.64 303.35,168.68 306.42,187.44 309.49,175.97 312.56,180.97 315.62,173.68 318.69,179.72 321.76,198.48 324.83,200.15 327.90,199.11 330.97,195.98 334.04,208.28 337.11,213.70 340.18,229.33 343.25,225.58 346.32,219.12 349.39,211.62 352.46,255.81 355.53,234.34 358.60,239.55 361.67,246.84 364.74,248.93 367.81,256.85 370.88,255.81 373.95,256.02 377.02,246.01 380.09,267.27 383.16,262.48 386.23,271.86 389.30,251.43 392.36,284.36 395.43,284.99 398.50,280.82 401.57,275.61 404.64,292.29 407.71,298.96 410.78,311.25 413.85,313.96 416.92,301.46 419.99,314.17 423.06,327.51 426.13,335.43 429.20,341.06 432.27,330.64 435.34,337.94 438.41,344.61 441.48,341.06 444.55,338.77 447.62,358.36 450.69,361.49 453.76,353.78 456.83,371.08 459.90,369.83 462.97,376.92 466.04,366.70 469.11,382.96 472.17,380.46 475.24,373.37 478.31,382.96 481.38,382.54 484.45,384.63 487.52,397.14 490.59,377.96 493.66,384.63 496.73,389.01 499.80,404.01 502.87,399.01 505.94,404.64 509.01,408.60 512.08,411.73 515.15,407.56 518.22,408.60 521.29,412.77 524.36,417.56 527.43,412.56 530.50,417.77 533.57,414.85 536.64,419.65 539.71,416.73 542.78,418.81 545.85,439.24 548.92,431.11 551.98,431.74 555.05,437.16 558.12,435.28 561.19,438.41 564.26,446.54 567.33,448.41 570.40,455.29 573.47,450.71 576.54,447.16 579.61,445.70 582.68,450.29 585.75,457.17 588.82,463.21 591.89,461.34 594.96,455.71 598.03,461.75 601.10,473.22 604.17,478.43 607.24,480.31 610.31,475.93 613.38,475.09 616.45,480.93 619.52,482.81 622.59,479.47 625.66,491.15 628.72,485.31 631.79,489.06 634.86,490.73 637.93,486.35 641.00,477.18 644.07,494.48 647.14,491.15 650.21,491.77 653.28,496.36 656.35,497.82 659.42,505.95 662.49,506.57 665.56,493.02 668.63,511.78 671.70,508.45 674.77,496.98 677.84,510.32 680.91,509.70 683.98,507.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,124.69 76.19,130.11 79.26,125.53 82.33,121.36 85.40,108.02 88.47,126.15 91.54,110.10 94.61,115.73 97.68,121.15 100.75,110.94 103.82,117.61 106.89,102.81 109.96,114.48 113.03,100.51 116.10,114.06 119.17,89.88 122.24,104.27 125.31,94.05 128.38,93.43 131.45,120.52 134.52,86.34 137.59,98.22 140.66,77.58 143.73,79.88 146.80,93.84 149.87,90.09 152.94,87.38 156.00,81.54 159.07,99.05 162.14,85.92 165.21,86.96 168.28,93.01 171.35,103.02 174.42,83.42 177.49,89.67 180.56,100.51 183.63,91.55 186.70,69.45 189.77,72.58 192.84,80.50 195.91,87.17 198.98,96.97 202.05,73.00 205.12,106.14 208.19,91.76 211.26,81.13 214.33,90.72 217.40,86.55 220.47,97.39 223.54,105.31 226.61,91.97 229.68,83.00 232.75,79.67 235.81,90.30 238.88,102.39 241.95,96.97 245.02,103.64 248.09,121.15 251.16,101.35 254.23,82.59 257.30,105.31 260.37,103.22 263.44,112.19 266.51,128.03 269.58,118.44 272.65,133.24 275.72,123.03 278.79,127.40 281.86,122.61 284.93,138.66 288.00,132.82 291.07,156.17 294.14,179.52 297.21,159.30 300.28,159.71 303.35,151.17 306.42,174.10 309.49,168.05 312.56,184.94 315.62,187.02 318.69,171.59 321.76,190.77 324.83,192.44 327.90,191.81 330.97,194.94 334.04,201.61 337.11,202.65 340.18,218.08 343.25,216.62 346.32,226.00 349.39,242.05 352.46,221.00 355.53,238.71 358.60,233.71 361.67,241.01 364.74,249.14 367.81,255.60 370.88,253.93 373.95,248.93 377.02,272.07 380.09,265.81 383.16,260.39 386.23,264.35 389.30,269.98 392.36,277.28 395.43,278.32 398.50,300.00 401.57,298.96 404.64,299.79 407.71,285.20 410.78,305.63 413.85,310.63 416.92,313.76 419.99,317.51 423.06,318.55 426.13,333.77 429.20,332.10 432.27,336.48 435.34,329.39 438.41,333.98 441.48,337.10 444.55,338.35 447.62,348.78 450.69,356.07 453.76,348.57 456.83,354.19 459.90,380.67 462.97,361.70 466.04,368.16 469.11,365.87 472.17,371.70 475.24,375.46 478.31,384.00 481.38,386.09 484.45,394.84 487.52,376.29 490.59,395.47 493.66,396.93 496.73,399.01 499.80,399.22 502.87,394.22 505.94,402.14 509.01,402.97 512.08,405.68 515.15,407.77 518.22,410.68 521.29,406.93 524.36,416.52 527.43,415.69 530.50,413.81 533.57,436.12 536.64,437.37 539.71,424.03 542.78,431.53 545.85,426.94 548.92,427.78 551.98,444.45 555.05,437.37 558.12,442.37 561.19,444.04 564.26,438.82 567.33,444.66 570.40,440.91 573.47,448.00 576.54,453.83 579.61,450.50 582.68,462.17 585.75,460.29 588.82,460.92 591.89,471.13 594.96,461.96 598.03,468.42 601.10,465.92 604.17,466.97 607.24,465.92 610.31,466.97 613.38,473.64 616.45,479.68 619.52,484.27 622.59,479.26 625.66,477.60 628.72,486.14 631.79,486.77 634.86,483.43 637.93,485.10 641.00,487.39 644.07,486.98 647.14,495.52 650.21,491.56 653.28,491.98 656.35,504.28 659.42,495.94 662.49,499.48 665.56,495.11 668.63,506.36 671.70,505.95 674.77,507.82 677.84,507.82 680.91,508.65 683.98,511.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,127.20 76.19,135.74 79.26,131.57 82.33,118.65 85.40,121.57 88.47,123.03 91.54,130.11 94.61,122.82 97.68,131.36 100.75,116.77 103.82,119.69 106.89,118.44 109.96,115.94 113.03,119.90 116.10,123.23 119.17,129.07 122.24,118.02 125.31,102.81 128.38,101.97 131.45,85.71 134.52,101.35 137.59,104.47 140.66,102.39 143.73,104.27 146.80,107.39 149.87,95.30 152.94,85.92 156.00,90.51 159.07,72.16 162.14,77.58 165.21,66.75 168.28,96.34 171.35,85.30 174.42,92.18 177.49,71.75 180.56,69.25 183.63,86.96 186.70,76.96 189.77,92.59 192.84,77.58 195.91,82.80 198.98,81.13 202.05,76.54 205.12,86.34 208.19,106.56 211.26,93.43 214.33,71.33 217.40,78.84 220.47,103.02 223.54,86.76 226.61,87.80 229.68,81.96 232.75,75.92 235.81,84.05 238.88,114.69 241.95,90.09 245.02,118.44 248.09,100.93 251.16,106.77 254.23,102.39 257.30,111.77 260.37,122.82 263.44,118.86 266.51,111.98 269.58,109.06 272.65,99.89 275.72,132.61 278.79,130.32 281.86,150.96 284.93,143.04 288.00,152.00 291.07,128.24 294.14,160.96 297.21,160.76 300.28,170.14 303.35,182.64 306.42,195.77 309.49,186.39 312.56,158.05 315.62,180.97 318.69,182.43 321.76,188.27 324.83,202.03 327.90,195.77 330.97,198.48 334.04,211.20 337.11,202.03 340.18,226.83 343.25,217.45 346.32,222.25 349.39,230.79 352.46,244.97 355.53,238.92 358.60,234.96 361.67,237.67 364.74,226.00 367.81,254.14 370.88,241.01 373.95,267.90 377.02,263.52 380.09,271.65 383.16,279.15 386.23,273.11 389.30,260.81 392.36,276.24 395.43,282.70 398.50,283.32 401.57,292.08 404.64,308.75 407.71,306.04 410.78,306.88 413.85,314.38 416.92,312.09 419.99,310.84 423.06,313.13 426.13,325.43 429.20,321.68 432.27,327.10 435.34,332.10 438.41,342.10 441.48,348.98 444.55,341.69 447.62,350.44 450.69,349.82 453.76,358.57 456.83,364.20 459.90,358.78 462.97,372.54 466.04,355.65 469.11,371.08 472.17,366.70 475.24,371.91 478.31,377.54 481.38,384.42 484.45,378.17 487.52,386.50 490.59,388.38 493.66,396.09 496.73,387.76 499.80,403.60 502.87,404.64 505.94,395.47 509.01,406.72 512.08,397.97 515.15,414.23 518.22,404.64 521.29,414.23 524.36,411.52 527.43,419.44 530.50,416.52 533.57,417.56 536.64,427.57 539.71,430.07 542.78,428.19 545.85,426.94 548.92,435.91 551.98,436.32 555.05,440.70 558.12,447.58 561.19,439.03 564.26,443.41 567.33,445.50 570.40,439.66 573.47,447.79 576.54,456.33 579.61,462.17 582.68,463.00 585.75,448.20 588.82,461.75 591.89,461.34 594.96,466.97 598.03,470.30 601.10,463.00 604.17,471.34 607.24,477.60 610.31,475.93 613.38,482.39 616.45,483.22 619.52,473.43 622.59,475.93 625.66,489.48 628.72,488.02 631.79,484.27 634.86,488.85 637.93,490.94 641.00,487.60 644.07,499.07 647.14,492.60 650.21,494.48 653.28,497.61 656.35,504.69 659.42,500.53 662.49,500.73 665.56,503.65 668.63,500.11 671.70,508.24 674.77,509.49 677.84,507.40 680.91,514.91 683.98,509.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,128.65 76.19,153.67 79.26,123.03 82.33,102.60 85.40,134.91 88.47,133.45 91.54,110.94 94.61,104.47 97.68,126.78 100.75,99.47 103.82,107.18 106.89,108.85 109.96,95.72 113.03,89.67 116.10,111.35 119.17,95.93 122.24,95.93 125.31,117.81 128.38,99.68 131.45,98.22 134.52,92.59 137.59,79.04 140.66,113.44 143.73,120.11 146.80,104.89 149.87,99.68 152.94,116.15 156.00,64.66 159.07,90.30 162.14,86.96 165.21,95.09 168.28,87.59 171.35,71.54 174.42,83.84 177.49,79.67 180.56,97.80 183.63,58.20 186.70,83.21 189.77,98.22 192.84,79.04 195.91,81.34 198.98,76.33 202.05,74.25 205.12,86.76 208.19,84.05 211.26,80.92 214.33,91.55 217.40,102.81 220.47,89.88 223.54,61.53 226.61,88.01 229.68,90.51 232.75,93.84 235.81,90.72 238.88,102.81 241.95,85.71 245.02,75.29 248.09,118.23 251.16,103.02 254.23,111.56 257.30,106.77 260.37,128.65 263.44,106.77 266.51,121.98 269.58,128.86 272.65,134.07 275.72,145.12 278.79,140.54 281.86,131.16 284.93,145.33 288.00,143.87 291.07,144.70 294.14,162.84 297.21,162.84 300.28,145.12 303.35,166.38 306.42,184.10 309.49,175.76 312.56,173.47 315.62,175.56 318.69,205.36 321.76,187.64 324.83,192.23 327.90,196.19 330.97,200.36 334.04,200.57 337.11,214.74 340.18,228.92 343.25,216.62 346.32,215.79 349.39,228.71 352.46,223.91 355.53,249.97 358.60,232.25 361.67,238.92 364.74,237.46 367.81,251.43 370.88,258.93 373.95,247.68 377.02,277.49 380.09,263.10 383.16,278.11 386.23,271.44 389.30,292.91 392.36,292.08 395.43,298.33 398.50,298.96 401.57,307.29 404.64,279.57 407.71,292.08 410.78,317.51 413.85,315.42 416.92,295.20 419.99,309.38 423.06,318.34 426.13,328.76 429.20,324.39 432.27,320.63 435.34,326.26 438.41,339.81 441.48,331.47 444.55,335.64 447.62,344.40 450.69,361.49 453.76,353.78 456.83,355.24 459.90,365.66 462.97,371.08 466.04,370.45 469.11,376.92 472.17,371.70 475.24,373.79 478.31,372.96 481.38,377.75 484.45,379.00 487.52,391.92 490.59,388.80 493.66,395.88 496.73,402.55 499.80,391.72 502.87,402.97 505.94,407.56 509.01,402.35 512.08,409.23 515.15,410.68 518.22,405.26 521.29,407.56 524.36,409.64 527.43,419.02 530.50,425.07 533.57,419.02 536.64,422.15 539.71,431.53 542.78,424.23 545.85,428.82 548.92,429.65 551.98,435.49 555.05,449.25 558.12,431.95 561.19,438.41 564.26,431.74 567.33,436.74 570.40,456.96 573.47,454.88 576.54,451.54 579.61,451.33 582.68,460.09 585.75,455.50 588.82,455.50 591.89,471.34 594.96,463.84 598.03,465.09 601.10,468.63 604.17,472.59 607.24,468.42 610.31,470.72 613.38,480.51 616.45,474.68 619.52,488.64 622.59,486.98 625.66,486.14 628.72,491.77 631.79,488.44 634.86,486.14 637.93,484.89 641.00,488.85 644.07,494.69 647.14,492.19 650.21,503.44 653.28,498.23 656.35,491.77 659.42,503.03 662.49,500.73 665.56,501.78 668.63,506.99 671.70,501.78 674.77,511.16 677.84,506.78 680.91,507.82 683.98,519.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,106.77 76.19,142.20 79.26,131.16 82.33,122.82 85.40,129.49 88.47,131.99 91.54,125.53 94.61,130.11 97.68,104.27 100.75,106.98 103.82,122.40 106.89,113.02 109.96,112.60 113.03,110.73 116.10,104.89 119.17,102.18 122.24,101.35 125.31,109.48 128.38,89.26 131.45,100.51 134.52,110.31 137.59,99.47 140.66,88.84 143.73,116.77 146.80,87.17 149.87,79.25 152.94,103.22 156.00,58.41 159.07,92.38 162.14,98.01 165.21,79.25 168.28,88.42 171.35,80.29 174.42,69.25 177.49,80.09 180.56,63.83 183.63,97.39 186.70,93.63 189.77,65.70 192.84,70.29 195.91,76.75 198.98,66.33 202.05,88.22 205.12,83.00 208.19,88.01 211.26,102.18 214.33,101.97 217.40,74.04 220.47,97.80 223.54,102.60 226.61,90.72 229.68,88.84 232.75,101.97 235.81,110.52 238.88,94.47 241.95,88.63 245.02,125.74 248.09,95.09 251.16,104.89 254.23,114.27 257.30,86.55 260.37,104.06 263.44,128.24 266.51,130.11 269.58,138.45 272.65,141.79 275.72,152.21 278.79,144.29 281.86,143.66 284.93,147.00 288.00,166.59 291.07,152.00 294.14,147.41 297.21,151.58 300.28,162.21 303.35,155.13 306.42,167.63 309.49,197.23 312.56,189.10 315.62,179.93 318.69,201.40 321.76,172.85 324.83,190.15 327.90,201.82 330.97,201.82 334.04,199.32 337.11,198.69 340.18,219.12 343.25,206.61 346.32,209.74 349.39,230.79 352.46,228.92 355.53,225.58 358.60,234.96 361.67,244.55 364.74,225.37 367.81,268.52 370.88,249.14 373.95,262.89 377.02,253.10 380.09,277.69 383.16,271.44 386.23,266.02 389.30,268.31 392.36,280.61 395.43,285.20 398.50,296.66 401.57,295.62 404.64,309.17 407.71,290.62 410.78,308.54 413.85,303.96 416.92,309.59 419.99,325.01 423.06,324.39 426.13,323.76 429.20,339.81 432.27,341.48 435.34,332.93 438.41,336.27 441.48,342.10 444.55,343.56 447.62,360.45 450.69,351.69 453.76,362.95 456.83,352.32 459.90,350.86 462.97,356.90 466.04,354.40 469.11,366.91 472.17,366.49 475.24,373.58 478.31,379.00 481.38,388.59 484.45,369.83 487.52,399.01 490.59,391.09 493.66,374.21 496.73,399.43 499.80,402.97 502.87,402.35 505.94,395.47 509.01,391.51 512.08,392.97 515.15,404.64 518.22,401.51 521.29,421.32 524.36,421.73 527.43,416.10 530.50,413.60 533.57,427.78 536.64,415.06 539.71,430.07 542.78,431.11 545.85,424.23 548.92,429.44 551.98,436.53 555.05,435.70 558.12,434.24 561.19,447.58 564.26,445.08 567.33,444.24 570.40,440.28 573.47,459.04 576.54,458.63 579.61,449.66 582.68,461.34 585.75,451.54 588.82,461.34 591.89,460.29 594.96,461.75 598.03,467.38 601.10,467.38 604.17,463.84 607.24,474.89 610.31,475.30 613.38,466.97 616.45,475.09 619.52,470.72 622.59,484.47 625.66,484.27 628.72,489.89 631.79,476.76 634.86,491.35 637.93,491.35 641.00,485.52 644.07,481.97 647.14,494.48 650.21,503.24 653.28,496.36 656.35,495.52 659.42,504.90 662.49,491.77 665.56,503.24 668.63,511.78 671.70,503.86 674.77,514.70 677.84,519.08 680.91,521.37 683.98,517.41 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,126.78 76.19,103.22 79.26,142.62 82.33,119.27 85.40,114.90 88.47,120.11 91.54,117.81 94.61,103.22 97.68,126.57 100.75,110.94 103.82,123.44 106.89,123.44 109.96,120.73 113.03,95.72 116.10,103.22 119.17,119.27 122.24,111.77 125.31,91.97 128.38,93.22 131.45,106.98 134.52,99.26 137.59,116.98 140.66,95.93 143.73,99.68 146.80,101.35 149.87,111.35 152.94,98.64 156.00,100.72 159.07,104.47 162.14,86.13 165.21,100.10 168.28,92.18 171.35,97.60 174.42,87.59 177.49,83.63 180.56,79.67 183.63,94.26 186.70,66.95 189.77,96.55 192.84,71.54 195.91,70.08 198.98,93.63 202.05,91.34 205.12,71.33 208.19,80.29 211.26,77.58 214.33,76.54 217.40,98.22 220.47,70.71 223.54,103.64 226.61,83.42 229.68,87.80 232.75,89.05 235.81,96.14 238.88,120.52 241.95,109.48 245.02,96.76 248.09,112.60 251.16,118.86 254.23,112.60 257.30,100.72 260.37,114.27 263.44,120.94 266.51,121.57 269.58,137.41 272.65,139.70 275.72,154.29 278.79,163.67 281.86,129.07 284.93,129.90 288.00,157.00 291.07,158.05 294.14,148.67 297.21,163.26 300.28,168.26 303.35,169.09 306.42,166.59 309.49,170.55 312.56,172.43 315.62,199.11 318.69,176.81 321.76,190.77 324.83,173.26 327.90,199.73 330.97,198.69 334.04,204.11 337.11,214.33 340.18,220.37 343.25,238.92 346.32,217.45 349.39,233.09 352.46,236.63 355.53,238.30 358.60,235.38 361.67,259.98 364.74,251.01 367.81,243.72 370.88,258.73 373.95,268.73 377.02,254.77 380.09,269.15 383.16,271.86 386.23,274.36 389.30,265.19 392.36,281.66 395.43,284.99 398.50,284.57 401.57,304.58 404.64,297.91 407.71,310.00 410.78,309.80 413.85,308.54 416.92,303.54 419.99,326.47 423.06,305.00 426.13,318.97 429.20,329.18 432.27,327.72 435.34,338.35 438.41,363.37 441.48,360.87 444.55,337.73 447.62,359.82 450.69,360.87 453.76,365.24 456.83,356.49 459.90,388.59 462.97,366.08 466.04,365.45 469.11,379.83 472.17,380.25 475.24,381.71 478.31,376.50 481.38,380.46 484.45,390.88 487.52,393.38 490.59,388.38 493.66,388.80 496.73,403.18 499.80,402.55 502.87,400.68 505.94,399.43 509.01,400.89 512.08,405.47 515.15,401.72 518.22,400.47 521.29,405.68 524.36,401.10 527.43,420.27 530.50,412.35 533.57,411.73 536.64,419.86 539.71,418.19 542.78,422.57 545.85,428.82 548.92,435.49 551.98,434.86 555.05,427.99 558.12,449.46 561.19,447.16 564.26,439.87 567.33,444.87 570.40,446.54 573.47,442.79 576.54,453.83 579.61,464.88 582.68,450.29 585.75,456.54 588.82,461.75 591.89,461.96 594.96,458.63 598.03,468.42 601.10,476.14 604.17,468.63 607.24,486.14 610.31,472.18 613.38,474.05 616.45,474.89 619.52,484.68 622.59,481.14 625.66,479.68 628.72,481.97 631.79,489.89 634.86,488.02 637.93,488.85 641.00,490.10 644.07,494.06 647.14,499.69 650.21,494.27 653.28,494.69 656.35,500.94 659.42,502.61 662.49,499.69 665.56,492.40 668.63,506.78 671.70,499.69 674.77,502.61 677.84,506.78 680.91,509.70 683.98,516.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,128.65 76.19,138.45 79.26,123.65 82.33,111.98 85.40,121.15 88.47,105.52 91.54,100.31 94.61,116.15 97.68,99.26 100.75,111.14 103.82,109.69 106.89,90.30 109.96,109.27 113.03,102.18 116.10,84.67 119.17,85.30 122.24,97.80 125.31,101.56 128.38,87.59 131.45,91.97 134.52,103.85 137.59,95.30 140.66,92.80 143.73,67.16 146.80,91.97 149.87,87.38 152.94,83.21 156.00,92.18 159.07,87.80 162.14,93.22 165.21,86.13 168.28,86.76 171.35,95.30 174.42,75.29 177.49,61.53 180.56,84.46 183.63,92.38 186.70,76.96 189.77,58.41 192.84,79.88 195.91,81.34 198.98,90.30 202.05,86.76 205.12,95.09 208.19,73.83 211.26,91.13 214.33,70.71 217.40,69.25 220.47,91.34 223.54,107.39 226.61,99.68 229.68,74.67 232.75,83.84 235.81,99.05 238.88,92.59 241.95,107.18 245.02,102.60 248.09,113.02 251.16,96.97 254.23,105.72 257.30,105.31 260.37,100.93 263.44,123.65 266.51,136.58 269.58,124.69 272.65,121.36 275.72,131.57 278.79,128.86 281.86,120.73 284.93,150.54 288.00,164.30 291.07,162.21 294.14,168.47 297.21,174.72 300.28,157.00 303.35,153.04 306.42,182.23 309.49,177.64 312.56,174.72 315.62,165.34 318.69,164.92 321.76,195.15 324.83,194.52 327.90,200.15 330.97,194.94 334.04,195.36 337.11,207.24 340.18,199.94 343.25,207.45 346.32,218.29 349.39,227.46 352.46,220.16 355.53,226.42 358.60,246.64 361.67,245.39 364.74,245.59 367.81,242.68 370.88,263.52 373.95,249.76 377.02,258.73 380.09,270.82 383.16,263.31 386.23,273.73 389.30,282.70 392.36,279.99 395.43,296.87 398.50,291.87 401.57,287.07 404.64,303.75 407.71,292.70 410.78,305.63 413.85,301.87 416.92,309.38 419.99,315.22 423.06,327.93 426.13,313.55 429.20,327.72 432.27,338.98 435.34,328.76 438.41,335.02 441.48,347.52 444.55,362.12 447.62,358.57 450.69,362.74 453.76,360.87 456.83,353.99 459.90,367.95 462.97,359.20 466.04,372.12 469.11,361.28 472.17,384.42 475.24,369.20 478.31,377.33 481.38,377.12 484.45,399.22 487.52,386.09 490.59,386.09 493.66,386.50 496.73,398.80 499.80,392.34 502.87,394.43 505.94,392.13 509.01,400.05 512.08,400.26 515.15,397.34 518.22,410.89 521.29,411.10 524.36,416.10 527.43,420.27 530.50,413.81 533.57,421.11 536.64,423.40 539.71,420.69 542.78,416.31 545.85,436.53 548.92,433.61 551.98,430.90 555.05,441.95 558.12,439.66 561.19,451.33 564.26,448.83 567.33,444.87 570.40,449.46 573.47,448.41 576.54,443.20 579.61,450.91 582.68,456.96 585.75,454.67 588.82,466.97 591.89,470.09 594.96,470.93 598.03,466.76 601.10,472.18 604.17,478.01 607.24,464.46 610.31,480.93 613.38,475.72 616.45,476.76 619.52,472.18 622.59,477.39 625.66,488.64 628.72,488.23 631.79,486.98 634.86,491.98 637.93,488.44 641.00,487.18 644.07,500.73 647.14,484.06 650.21,495.94 653.28,492.19 656.35,503.03 659.42,503.24 662.49,497.40 665.56,505.32 668.63,503.86 671.70,506.78 674.77,516.16 677.84,511.57 680.91,511.57 683.98,515.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,129.90 76.19,148.87 79.26,122.40 82.33,125.74 85.40,111.35 88.47,119.69 91.54,106.35 94.61,114.06 97.68,110.73 100.75,105.93 103.82,106.35 106.89,124.69 109.96,123.23 113.03,96.55 116.10,111.35 119.17,100.51 122.24,93.63 125.31,98.43 128.38,97.60 131.45,106.77 134.52,87.59 137.59,99.89 140.66,95.30 143.73,95.93 146.80,80.29 149.87,109.69 152.94,95.51 156.00,90.51 159.07,83.42 162.14,95.09 165.21,95.72 168.28,78.21 171.35,82.38 174.42,84.25 177.49,85.71 180.56,104.47 183.63,97.80 186.70,93.22 189.77,101.14 192.84,90.30 195.91,88.01 198.98,78.00 202.05,82.17 205.12,88.63 208.19,106.56 211.26,88.63 214.33,97.39 217.40,89.88 220.47,89.05 223.54,111.14 226.61,82.80 229.68,78.84 232.75,86.13 235.81,88.22 238.88,107.60 241.95,110.31 245.02,112.60 248.09,109.27 251.16,113.44 254.23,103.02 257.30,118.44 260.37,121.36 263.44,128.86 266.51,121.78 269.58,136.99 272.65,135.32 275.72,142.20 278.79,130.74 281.86,145.54 284.93,133.87 288.00,131.99 291.07,152.83 294.14,167.01 297.21,153.67 300.28,166.17 303.35,162.63 306.42,161.59 309.49,191.40 312.56,177.01 315.62,177.43 318.69,186.39 321.76,188.48 324.83,210.37 327.90,217.66 330.97,204.95 334.04,213.28 337.11,213.08 340.18,234.34 343.25,228.71 346.32,227.88 349.39,224.33 352.46,248.09 355.53,228.92 358.60,248.09 361.67,235.59 364.74,257.48 367.81,240.59 370.88,246.84 373.95,252.26 377.02,259.77 380.09,268.52 383.16,267.27 386.23,284.36 389.30,276.86 392.36,283.11 395.43,300.62 398.50,289.58 401.57,288.95 404.64,298.33 407.71,294.37 410.78,294.58 413.85,313.55 416.92,305.63 419.99,328.35 423.06,314.80 426.13,330.64 429.20,320.63 432.27,332.93 435.34,341.69 438.41,342.10 441.48,338.14 444.55,350.44 447.62,339.60 450.69,372.75 453.76,353.99 456.83,354.61 459.90,351.90 462.97,370.25 466.04,374.00 469.11,369.83 472.17,381.92 475.24,375.25 478.31,387.55 481.38,381.50 484.45,390.26 487.52,378.58 490.59,388.38 493.66,384.00 496.73,401.51 499.80,396.93 502.87,404.85 505.94,402.35 509.01,394.84 512.08,408.18 515.15,412.56 518.22,408.39 521.29,415.90 524.36,410.68 527.43,422.77 530.50,401.10 533.57,421.94 536.64,435.07 539.71,415.90 542.78,424.23 545.85,421.52 548.92,441.53 551.98,427.57 555.05,434.45 558.12,439.66 561.19,424.23 564.26,440.08 567.33,442.16 570.40,441.33 573.47,446.12 576.54,451.54 579.61,456.54 582.68,460.09 585.75,465.71 588.82,459.25 591.89,459.88 594.96,459.25 598.03,471.13 601.10,457.38 604.17,467.17 607.24,477.39 610.31,481.97 613.38,472.59 616.45,480.72 619.52,473.01 622.59,489.27 625.66,473.43 628.72,477.39 631.79,493.65 634.86,488.44 637.93,485.31 641.00,487.39 644.07,496.77 647.14,510.53 650.21,498.44 653.28,500.73 656.35,499.69 659.42,502.82 662.49,505.11 665.56,501.15 668.63,506.15 671.70,507.20 674.77,508.03 677.84,507.20 680.91,516.78 683.98,519.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,133.45 76.19,121.57 79.26,122.40 82.33,138.24 85.40,125.74 88.47,133.87 91.54,113.02 94.61,96.14 97.68,127.40 100.75,123.44 103.82,110.94 106.89,98.01 109.96,133.03 113.03,91.13 116.10,123.23 119.17,112.60 122.24,110.73 125.31,128.24 128.38,119.48 131.45,108.43 134.52,116.36 137.59,104.89 140.66,96.76 143.73,92.18 146.80,100.10 149.87,103.64 152.94,97.39 156.00,96.97 159.07,94.05 162.14,93.22 165.21,99.68 168.28,97.80 171.35,92.59 174.42,85.92 177.49,92.80 180.56,58.82 183.63,79.88 186.70,82.59 189.77,97.18 192.84,66.95 195.91,75.71 198.98,65.08 202.05,84.25 205.12,91.97 208.19,90.51 211.26,69.25 214.33,82.80 217.40,86.76 220.47,93.22 223.54,87.17 226.61,106.14 229.68,95.51 232.75,113.02 235.81,74.04 238.88,91.55 241.95,90.93 245.02,101.56 248.09,103.22 251.16,103.22 254.23,110.94 257.30,116.98 260.37,115.11 263.44,117.81 266.51,119.48 269.58,124.90 272.65,110.94 275.72,144.50 278.79,115.11 281.86,119.48 284.93,127.61 288.00,147.00 291.07,161.80 294.14,130.53 297.21,153.67 300.28,142.20 303.35,159.09 306.42,166.59 309.49,188.27 312.56,181.60 315.62,183.68 318.69,190.15 321.76,182.64 324.83,197.23 327.90,197.86 330.97,179.93 334.04,203.49 337.11,215.99 340.18,215.37 343.25,227.25 346.32,230.38 349.39,223.71 352.46,227.88 355.53,242.88 358.60,236.84 361.67,249.55 364.74,251.64 367.81,257.89 370.88,269.57 373.95,276.24 377.02,254.97 380.09,281.45 383.16,280.40 386.23,273.53 389.30,272.27 392.36,268.94 395.43,278.95 398.50,298.54 401.57,288.33 404.64,296.45 407.71,298.75 410.78,299.16 413.85,307.09 416.92,311.67 419.99,321.05 423.06,318.13 426.13,312.71 429.20,332.52 432.27,333.14 435.34,342.52 438.41,342.73 441.48,352.11 444.55,335.23 447.62,359.20 450.69,356.70 453.76,363.58 456.83,365.24 459.90,357.53 462.97,369.20 466.04,357.74 469.11,370.25 472.17,364.41 475.24,379.00 478.31,376.50 481.38,375.67 484.45,385.88 487.52,385.46 490.59,389.42 493.66,388.17 496.73,389.01 499.80,400.68 502.87,397.34 505.94,396.51 509.01,404.85 512.08,404.01 515.15,412.35 518.22,414.64 521.29,411.52 524.36,414.85 527.43,422.77 530.50,422.36 533.57,422.57 536.64,430.49 539.71,420.48 542.78,432.57 545.85,431.74 548.92,426.73 551.98,437.78 555.05,436.53 558.12,450.08 561.19,431.32 564.26,441.95 567.33,446.12 570.40,453.00 573.47,457.17 576.54,453.42 579.61,465.30 582.68,456.96 585.75,460.71 588.82,468.01 591.89,470.09 594.96,472.38 598.03,463.63 601.10,466.13 604.17,469.47 607.24,476.35 610.31,479.89 613.38,476.14 616.45,485.93 619.52,480.93 622.59,472.80 625.66,486.98 628.72,485.31 631.79,489.89 634.86,495.31 637.93,486.98 641.00,493.02 644.07,496.56 647.14,496.15 650.21,497.40 653.28,488.02 656.35,492.60 659.42,509.91 662.49,496.36 665.56,506.78 668.63,504.90 671.70,508.65 674.77,503.44 677.84,501.98 680.91,506.57 683.98,509.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,111.14 76.19,137.83 79.26,126.15 82.33,109.06 85.40,118.02 88.47,126.99 91.54,126.15 94.61,103.64 97.68,119.90 100.75,101.35 103.82,114.90 106.89,104.47 109.96,120.73 113.03,105.52 116.10,91.34 119.17,110.10 122.24,123.86 125.31,121.15 128.38,104.27 131.45,110.52 134.52,81.75 137.59,104.06 140.66,100.51 143.73,83.63 146.80,90.72 149.87,98.01 152.94,70.08 156.00,102.81 159.07,78.00 162.14,88.42 165.21,84.67 168.28,94.05 171.35,70.71 174.42,74.87 177.49,86.76 180.56,88.63 183.63,76.13 186.70,91.76 189.77,82.80 192.84,90.72 195.91,75.71 198.98,70.50 202.05,103.85 205.12,69.66 208.19,88.22 211.26,81.34 214.33,96.14 217.40,90.51 220.47,84.88 223.54,75.71 226.61,81.34 229.68,90.09 232.75,96.97 235.81,117.19 238.88,105.72 241.95,90.72 245.02,105.72 248.09,99.47 251.16,100.31 254.23,91.55 257.30,117.81 260.37,116.98 263.44,92.59 266.51,127.40 269.58,114.27 272.65,110.10 275.72,123.86 278.79,131.16 281.86,141.37 284.93,138.03 288.00,146.58 291.07,144.91 294.14,163.05 297.21,152.63 300.28,172.85 303.35,165.55 306.42,186.39 309.49,159.71 312.56,161.59 315.62,187.85 318.69,186.60 321.76,183.89 324.83,189.94 327.90,205.78 330.97,194.52 334.04,212.24 337.11,222.87 340.18,214.53 343.25,229.96 346.32,207.03 349.39,227.04 352.46,237.26 355.53,229.33 358.60,252.26 361.67,236.63 364.74,246.22 367.81,251.22 370.88,270.82 373.95,270.19 377.02,260.39 380.09,254.35 383.16,269.57 386.23,286.24 389.30,293.12 392.36,287.28 395.43,291.87 398.50,299.16 401.57,291.04 404.64,291.45 407.71,305.21 410.78,296.66 413.85,308.54 416.92,307.09 419.99,312.09 423.06,316.26 426.13,318.13 429.20,328.76 432.27,329.81 435.34,356.07 438.41,333.35 441.48,341.48 444.55,343.98 447.62,350.86 450.69,349.40 453.76,354.82 456.83,358.36 459.90,369.83 462.97,368.79 466.04,355.45 469.11,365.66 472.17,374.41 475.24,386.30 478.31,377.54 481.38,399.01 484.45,384.21 487.52,391.51 490.59,387.96 493.66,400.26 496.73,383.38 499.80,402.14 502.87,392.55 505.94,392.97 509.01,397.14 512.08,406.72 515.15,407.14 518.22,401.93 521.29,404.64 524.36,420.69 527.43,413.60 530.50,414.44 533.57,417.35 536.64,425.90 539.71,435.49 542.78,428.19 545.85,425.07 548.92,435.70 551.98,438.41 555.05,432.57 558.12,439.03 561.19,444.45 564.26,446.33 567.33,449.66 570.40,445.50 573.47,461.13 576.54,449.04 579.61,452.79 582.68,457.59 585.75,473.64 588.82,457.38 591.89,459.25 594.96,465.51 598.03,453.83 601.10,482.18 604.17,471.97 607.24,481.77 610.31,479.06 613.38,482.39 616.45,475.93 619.52,476.55 622.59,479.06 625.66,483.85 628.72,476.97 631.79,488.85 634.86,481.77 637.93,496.36 641.00,485.31 644.07,495.73 647.14,486.77 650.21,501.36 653.28,486.98 656.35,483.02 659.42,498.86 662.49,498.65 665.56,503.86 668.63,500.94 671.70,502.61 674.77,502.61 677.84,510.74 680.91,514.28 683.98,506.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,148.67 76.19,137.41 79.26,123.44 82.33,99.05 85.40,129.28 88.47,124.49 91.54,116.98 94.61,118.23 97.68,112.60 100.75,108.85 103.82,108.64 106.89,105.72 109.96,113.44 113.03,111.35 116.10,97.18 119.17,115.94 122.24,122.82 125.31,109.27 128.38,102.39 131.45,108.43 134.52,92.59 137.59,95.30 140.66,91.34 143.73,99.68 146.80,105.72 149.87,95.30 152.94,91.34 156.00,92.38 159.07,112.40 162.14,79.88 165.21,80.09 168.28,96.34 171.35,90.51 174.42,81.96 177.49,101.97 180.56,84.25 183.63,78.84 186.70,69.04 189.77,64.04 192.84,89.26 195.91,79.25 198.98,93.63 202.05,79.25 205.12,77.79 208.19,86.13 211.26,100.51 214.33,101.56 217.40,91.13 220.47,89.47 223.54,80.29 226.61,89.05 229.68,99.05 232.75,104.06 235.81,94.26 238.88,98.85 241.95,103.64 245.02,110.10 248.09,124.28 251.16,108.02 254.23,108.85 257.30,106.35 260.37,124.69 263.44,101.56 266.51,121.36 269.58,124.07 272.65,111.35 275.72,140.54 278.79,135.12 281.86,160.96 284.93,167.01 288.00,142.83 291.07,183.06 294.14,156.79 297.21,158.25 300.28,178.06 303.35,153.67 306.42,162.42 309.49,163.88 312.56,172.64 315.62,190.77 318.69,180.56 321.76,183.27 324.83,195.98 327.90,194.73 330.97,204.95 334.04,207.86 337.11,212.24 340.18,226.62 343.25,202.86 346.32,223.50 349.39,236.84 352.46,221.62 355.53,233.71 358.60,247.47 361.67,222.66 364.74,250.60 367.81,253.10 370.88,250.60 373.95,261.44 377.02,263.31 380.09,268.94 383.16,257.89 386.23,276.03 389.30,288.95 392.36,288.53 395.43,288.12 398.50,294.58 401.57,292.91 404.64,298.54 407.71,306.67 410.78,308.54 413.85,321.68 416.92,298.75 419.99,317.51 423.06,320.22 426.13,325.64 429.20,346.69 432.27,325.01 435.34,335.02 438.41,356.70 441.48,348.78 444.55,336.89 447.62,360.45 450.69,356.49 453.76,352.53 456.83,361.07 459.90,359.20 462.97,372.12 466.04,370.04 469.11,370.25 472.17,360.03 475.24,374.62 478.31,372.75 481.38,386.71 484.45,368.16 487.52,386.09 490.59,394.43 493.66,392.13 496.73,389.21 499.80,401.30 502.87,399.43 505.94,402.97 509.01,397.34 512.08,401.51 515.15,402.97 518.22,416.10 521.29,417.98 524.36,419.02 527.43,410.68 530.50,419.23 533.57,426.11 536.64,428.19 539.71,410.89 542.78,423.19 545.85,428.40 548.92,439.03 551.98,440.70 555.05,432.99 558.12,437.99 561.19,443.20 564.26,437.78 567.33,442.99 570.40,458.21 573.47,458.21 576.54,448.41 579.61,459.88 582.68,456.96 585.75,461.13 588.82,460.09 591.89,451.75 594.96,475.09 598.03,468.63 601.10,460.50 604.17,473.64 607.24,478.22 610.31,471.97 613.38,479.68 616.45,478.22 619.52,481.97 622.59,471.97 625.66,486.56 628.72,480.31 631.79,493.23 634.86,485.31 637.93,493.65 641.00,493.65 644.07,491.35 647.14,490.52 650.21,487.39 653.28,500.11 656.35,500.53 659.42,500.11 662.49,500.11 665.56,505.74 668.63,505.11 671.70,507.20 674.77,513.03 677.84,501.98 680.91,498.44 683.98,509.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,114.69 76.19,131.36 79.26,109.27 82.33,124.07 85.40,118.23 88.47,124.90 91.54,134.91 94.61,120.52 97.68,127.82 100.75,99.47 103.82,110.73 106.89,123.86 109.96,120.32 113.03,126.99 116.10,110.94 119.17,111.77 122.24,100.93 125.31,100.31 128.38,88.63 131.45,116.15 134.52,90.72 137.59,105.72 140.66,100.31 143.73,96.34 146.80,84.67 149.87,108.23 152.94,83.42 156.00,82.59 159.07,101.97 162.14,81.54 165.21,94.26 168.28,79.46 171.35,90.93 174.42,100.51 177.49,97.18 180.56,81.34 183.63,64.04 186.70,78.00 189.77,76.75 192.84,96.14 195.91,93.43 198.98,91.34 202.05,77.38 205.12,86.96 208.19,94.47 211.26,96.14 214.33,86.13 217.40,99.05 220.47,74.04 223.54,90.09 226.61,89.47 229.68,93.43 232.75,90.51 235.81,98.85 238.88,97.39 241.95,100.31 245.02,101.97 248.09,99.68 251.16,123.03 254.23,102.60 257.30,107.60 260.37,98.22 263.44,106.35 266.51,119.69 269.58,126.36 272.65,124.49 275.72,152.00 278.79,140.54 281.86,147.21 284.93,153.88 288.00,149.08 291.07,148.46 294.14,154.29 297.21,161.59 300.28,170.34 303.35,170.34 306.42,163.67 309.49,167.84 312.56,188.27 315.62,170.14 318.69,192.65 321.76,193.06 324.83,178.26 327.90,196.61 330.97,197.44 334.04,207.45 337.11,219.33 340.18,227.88 343.25,235.80 346.32,223.29 349.39,235.80 352.46,244.55 355.53,243.93 358.60,230.79 361.67,236.84 364.74,248.93 367.81,267.27 370.88,245.18 373.95,263.52 377.02,252.68 380.09,266.65 383.16,252.26 386.23,259.77 389.30,282.91 392.36,295.83 395.43,291.45 398.50,282.49 401.57,295.20 404.64,293.12 407.71,300.42 410.78,314.17 413.85,320.63 416.92,308.54 419.99,314.17 423.06,315.42 426.13,325.22 429.20,324.60 432.27,331.47 435.34,344.19 438.41,334.60 441.48,343.56 444.55,348.15 447.62,349.40 450.69,357.74 453.76,359.82 456.83,362.95 459.90,363.58 462.97,380.46 466.04,374.21 469.11,370.25 472.17,380.88 475.24,376.71 478.31,383.17 481.38,366.08 484.45,386.09 487.52,387.96 490.59,384.21 493.66,398.80 496.73,406.72 499.80,400.05 502.87,402.55 505.94,398.39 509.01,412.56 512.08,402.97 515.15,412.56 518.22,420.90 521.29,414.44 524.36,419.02 527.43,425.69 530.50,424.03 533.57,417.15 536.64,426.94 539.71,434.24 542.78,444.04 545.85,432.78 548.92,439.45 551.98,445.29 555.05,439.87 558.12,440.49 561.19,443.20 564.26,445.50 567.33,444.04 570.40,445.29 573.47,444.45 576.54,448.00 579.61,457.38 582.68,455.71 585.75,454.04 588.82,463.21 591.89,462.80 594.96,465.30 598.03,471.76 601.10,471.55 604.17,471.34 607.24,469.26 610.31,470.30 613.38,475.09 616.45,481.56 619.52,486.98 622.59,485.31 625.66,483.64 628.72,473.22 631.79,485.31 634.86,498.65 637.93,491.77 641.00,488.64 644.07,485.10 647.14,496.77 650.21,491.35 653.28,497.61 656.35,496.36 659.42,493.23 662.49,504.69 665.56,494.27 668.63,504.28 671.70,505.95 674.77,509.07 677.84,504.49 680.91,507.40 683.98,511.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,143.66 76.19,136.99 79.26,144.08 82.33,123.23 85.40,133.87 88.47,110.94 91.54,128.45 94.61,117.19 97.68,120.52 100.75,117.40 103.82,94.05 106.89,102.60 109.96,116.36 113.03,103.22 116.10,100.31 119.17,106.98 122.24,83.63 125.31,102.39 128.38,103.64 131.45,81.13 134.52,101.35 137.59,104.68 140.66,93.01 143.73,96.97 146.80,98.43 149.87,92.18 152.94,98.22 156.00,96.34 159.07,80.71 162.14,102.18 165.21,103.22 168.28,86.96 171.35,91.13 174.42,80.50 177.49,74.04 180.56,91.34 183.63,81.75 186.70,86.34 189.77,89.26 192.84,86.55 195.91,80.92 198.98,66.12 202.05,91.34 205.12,64.45 208.19,83.42 211.26,105.10 214.33,74.87 217.40,103.22 220.47,87.80 223.54,73.42 226.61,72.79 229.68,99.47 232.75,94.26 235.81,103.43 238.88,108.43 241.95,111.77 245.02,92.59 248.09,118.23 251.16,122.40 254.23,112.60 257.30,130.32 260.37,98.01 263.44,112.81 266.51,119.27 269.58,134.49 272.65,105.31 275.72,133.45 278.79,158.25 281.86,129.90 284.93,131.99 288.00,152.83 291.07,124.49 294.14,159.09 297.21,154.71 300.28,154.50 303.35,166.38 306.42,176.60 309.49,180.35 312.56,176.81 315.62,183.68 318.69,186.60 321.76,174.10 324.83,205.57 327.90,204.95 330.97,200.36 334.04,211.41 337.11,229.96 340.18,213.49 343.25,208.91 346.32,228.50 349.39,221.62 352.46,219.95 355.53,215.99 358.60,223.08 361.67,231.63 364.74,246.64 367.81,243.09 370.88,244.76 373.95,250.80 377.02,253.93 380.09,248.30 383.16,278.11 386.23,255.60 389.30,274.15 392.36,285.62 395.43,277.07 398.50,301.25 401.57,293.12 404.64,303.75 407.71,306.88 410.78,303.75 413.85,309.17 416.92,307.50 419.99,317.72 423.06,319.18 426.13,323.14 429.20,325.85 432.27,330.64 435.34,330.01 438.41,335.23 441.48,333.14 444.55,334.81 447.62,345.23 450.69,361.28 453.76,358.78 456.83,371.08 459.90,364.83 462.97,377.96 466.04,362.53 469.11,372.54 472.17,368.16 475.24,379.63 478.31,385.05 481.38,369.62 484.45,387.34 487.52,400.47 490.59,390.88 493.66,395.88 496.73,395.68 499.80,397.76 502.87,408.60 505.94,397.76 509.01,407.35 512.08,416.73 515.15,401.72 518.22,419.86 521.29,414.02 524.36,421.32 527.43,420.48 530.50,422.77 533.57,433.82 536.64,433.82 539.71,437.78 542.78,431.11 545.85,427.99 548.92,426.53 551.98,430.49 555.05,440.28 558.12,434.24 561.19,435.49 564.26,450.08 567.33,446.75 570.40,454.88 573.47,449.87 576.54,446.95 579.61,455.29 582.68,461.34 585.75,459.46 588.82,459.67 591.89,460.50 594.96,459.67 598.03,460.09 601.10,472.80 604.17,462.17 607.24,478.64 610.31,486.14 613.38,476.97 616.45,476.14 619.52,481.77 622.59,481.56 625.66,481.56 628.72,487.39 631.79,480.51 634.86,492.40 637.93,492.81 641.00,494.69 644.07,496.15 647.14,490.94 650.21,502.19 653.28,494.48 656.35,507.20 659.42,506.15 662.49,502.19 665.56,507.20 668.63,505.95 671.70,507.40 674.77,505.32 677.84,510.95 680.91,508.24 683.98,511.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,123.86 76.19,128.86 79.26,125.32 82.33,146.79 85.40,137.41 88.47,135.32 91.54,133.03 94.61,109.69 97.68,118.23 100.75,128.86 103.82,106.14 106.89,129.49 109.96,110.10 113.03,93.63 116.10,110.94 119.17,93.22 122.24,102.18 125.31,124.90 128.38,103.43 131.45,88.42 134.52,117.40 137.59,103.22 140.66,98.01 143.73,108.23 146.80,101.35 149.87,103.02 152.94,88.42 156.00,95.93 159.07,75.71 162.14,87.38 165.21,74.25 168.28,83.42 171.35,78.21 174.42,89.88 177.49,91.55 180.56,74.87 183.63,83.42 186.70,60.07 189.77,93.63 192.84,68.00 195.91,81.75 198.98,83.63 202.05,75.71 205.12,83.00 208.19,91.55 211.26,77.58 214.33,89.67 217.40,87.38 220.47,98.43 223.54,109.27 226.61,94.05 229.68,102.39 232.75,89.67 235.81,77.79 238.88,118.02 241.95,99.68 245.02,111.14 248.09,107.39 251.16,103.43 254.23,100.51 257.30,113.65 260.37,119.90 263.44,118.86 266.51,117.40 269.58,121.98 272.65,112.81 275.72,133.24 278.79,134.91 281.86,131.16 284.93,143.04 288.00,148.04 291.07,137.83 294.14,146.79 297.21,168.68 300.28,150.75 303.35,146.58 306.42,163.67 309.49,184.31 312.56,168.68 315.62,187.85 318.69,184.94 321.76,191.81 324.83,188.90 327.90,224.33 330.97,210.37 334.04,203.28 337.11,205.78 340.18,198.69 343.25,222.87 346.32,222.66 349.39,224.54 352.46,223.29 355.53,244.55 358.60,224.12 361.67,259.14 364.74,231.00 367.81,240.59 370.88,260.39 373.95,253.72 377.02,253.31 380.09,256.43 383.16,273.73 386.23,275.82 389.30,272.90 392.36,263.73 395.43,274.15 398.50,276.24 401.57,280.40 404.64,298.96 407.71,296.04 410.78,304.79 413.85,312.51 416.92,324.18 419.99,318.97 423.06,325.85 426.13,318.76 429.20,332.72 432.27,323.55 435.34,334.60 438.41,345.23 441.48,346.48 444.55,345.02 447.62,348.36 450.69,348.15 453.76,345.86 456.83,349.82 459.90,363.78 462.97,360.66 466.04,363.78 469.11,372.96 472.17,380.25 475.24,377.33 478.31,377.75 481.38,380.46 484.45,383.17 487.52,376.08 490.59,384.21 493.66,408.60 496.73,394.63 499.80,403.18 502.87,406.93 505.94,408.39 509.01,406.10 512.08,403.18 515.15,410.48 518.22,419.65 521.29,407.97 524.36,411.31 527.43,432.78 530.50,416.52 533.57,431.95 536.64,424.65 539.71,431.11 542.78,437.16 545.85,431.53 548.92,435.49 551.98,421.94 555.05,434.66 558.12,442.16 561.19,429.65 564.26,442.99 567.33,450.91 570.40,447.16 573.47,454.04 576.54,446.95 579.61,456.54 582.68,448.83 585.75,460.09 588.82,462.59 591.89,463.42 594.96,470.72 598.03,463.21 601.10,467.80 604.17,473.84 607.24,468.84 610.31,472.38 613.38,477.18 616.45,481.35 619.52,485.93 622.59,477.60 625.66,476.76 628.72,473.43 631.79,477.60 634.86,489.27 637.93,478.64 641.00,497.19 644.07,485.10 647.14,497.61 650.21,491.35 653.28,486.56 656.35,489.69 659.42,490.31 662.49,490.52 665.56,509.49 668.63,497.82 671.70,499.07 674.77,507.40 677.84,509.07 680.91,499.27 683.98,504.69 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,125.74 76.19,118.44 79.26,105.52 82.33,135.32 85.40,112.60 88.47,112.40 91.54,96.34 94.61,116.15 97.68,115.11 100.75,121.98 103.82,107.18 106.89,118.23 109.96,109.69 113.03,125.32 116.10,113.44 119.17,103.02 122.24,90.51 125.31,99.47 128.38,95.51 131.45,95.30 134.52,108.02 137.59,104.47 140.66,102.18 143.73,98.64 146.80,90.93 149.87,101.35 152.94,80.71 156.00,80.29 159.07,91.76 162.14,97.80 165.21,86.13 168.28,86.55 171.35,82.38 174.42,81.13 177.49,85.71 180.56,104.89 183.63,103.43 186.70,98.85 189.77,83.84 192.84,79.46 195.91,100.31 198.98,90.51 202.05,94.47 205.12,99.89 208.19,90.30 211.26,77.79 214.33,81.13 217.40,101.76 220.47,90.93 223.54,101.76 226.61,75.92 229.68,90.09 232.75,94.89 235.81,92.38 238.88,109.69 241.95,101.56 245.02,111.56 248.09,112.81 251.16,94.89 254.23,115.11 257.30,122.40 260.37,135.95 263.44,126.15 266.51,128.03 269.58,131.78 272.65,142.41 275.72,143.66 278.79,140.12 281.86,134.70 284.93,158.88 288.00,165.55 291.07,159.50 294.14,185.56 297.21,157.84 300.28,181.60 303.35,179.31 306.42,189.52 309.49,169.09 312.56,179.10 315.62,185.14 318.69,195.36 321.76,193.06 324.83,195.36 327.90,199.73 330.97,191.19 334.04,203.90 337.11,214.95 340.18,232.46 343.25,223.29 346.32,226.21 349.39,228.08 352.46,220.79 355.53,254.35 358.60,231.63 361.67,236.84 364.74,241.01 367.81,253.72 370.88,271.23 373.95,263.94 377.02,252.06 380.09,255.39 383.16,290.62 386.23,276.44 389.30,280.20 392.36,279.78 395.43,276.24 398.50,291.45 401.57,288.12 404.64,304.79 407.71,313.76 410.78,305.00 413.85,310.21 416.92,307.09 419.99,327.72 423.06,311.05 426.13,321.68 429.20,321.47 432.27,337.52 435.34,333.35 438.41,346.07 441.48,334.18 444.55,341.69 447.62,343.36 450.69,360.45 453.76,351.69 456.83,364.62 459.90,356.70 462.97,360.87 466.04,361.07 469.11,372.33 472.17,375.67 475.24,391.51 478.31,382.34 481.38,377.12 484.45,385.46 487.52,382.34 490.59,395.88 493.66,389.63 496.73,414.85 499.80,407.97 502.87,402.14 505.94,410.89 509.01,404.01 512.08,410.27 515.15,407.14 518.22,411.73 521.29,405.47 524.36,416.52 527.43,415.48 530.50,415.48 533.57,422.15 536.64,425.90 539.71,433.20 542.78,428.19 545.85,437.37 548.92,423.19 551.98,439.87 555.05,445.50 558.12,444.24 561.19,458.21 564.26,443.83 567.33,433.61 570.40,453.00 573.47,447.16 576.54,446.95 579.61,454.25 582.68,464.67 585.75,457.17 588.82,458.42 591.89,463.42 594.96,453.21 598.03,474.26 601.10,471.55 604.17,473.43 607.24,470.72 610.31,475.72 613.38,476.76 616.45,482.18 619.52,476.14 622.59,480.10 625.66,488.85 628.72,486.14 631.79,489.89 634.86,483.22 637.93,486.14 641.00,487.81 644.07,492.60 647.14,498.23 650.21,497.40 653.28,503.86 656.35,495.73 659.42,499.27 662.49,505.74 665.56,500.94 668.63,497.40 671.70,506.36 674.77,504.69 677.84,502.82 680.91,516.99 683.98,514.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,124.49 76.19,141.99 79.26,137.20 82.33,119.27 85.40,132.41 88.47,130.74 91.54,120.11 94.61,109.06 97.68,110.31 100.75,115.11 103.82,91.97 106.89,104.47 109.96,107.39 113.03,95.93 116.10,108.02 119.17,113.65 122.24,75.08 125.31,110.94 128.38,87.38 131.45,105.52 134.52,110.10 137.59,96.97 140.66,106.77 143.73,101.35 146.80,93.63 149.87,98.01 152.94,94.26 156.00,95.30 159.07,65.08 162.14,85.92 165.21,87.38 168.28,84.88 171.35,80.09 174.42,85.30 177.49,85.30 180.56,90.09 183.63,88.42 186.70,74.67 189.77,75.08 192.84,80.71 195.91,91.55 198.98,102.39 202.05,86.55 205.12,105.52 208.19,80.09 211.26,88.84 214.33,95.72 217.40,92.38 220.47,97.18 223.54,90.09 226.61,96.97 229.68,104.27 232.75,98.64 235.81,93.63 238.88,101.35 241.95,83.42 245.02,106.35 248.09,88.42 251.16,113.23 254.23,110.10 257.30,110.94 260.37,106.56 263.44,110.52 266.51,111.98 269.58,112.19 272.65,126.15 275.72,118.02 278.79,136.16 281.86,135.53 284.93,135.32 288.00,139.91 291.07,145.12 294.14,156.79 297.21,157.21 300.28,144.29 303.35,164.51 306.42,174.10 309.49,207.03 312.56,182.64 315.62,160.76 318.69,198.07 321.76,203.49 324.83,195.98 327.90,198.69 330.97,200.99 334.04,201.61 337.11,202.24 340.18,228.50 343.25,234.96 346.32,224.96 349.39,235.38 352.46,223.71 355.53,233.30 358.60,224.54 361.67,231.84 364.74,229.96 367.81,253.72 370.88,254.14 373.95,254.35 377.02,259.14 380.09,273.11 383.16,273.53 386.23,280.61 389.30,279.99 392.36,267.27 395.43,280.20 398.50,283.95 401.57,295.00 404.64,307.50 407.71,307.09 410.78,316.88 413.85,309.38 416.92,303.33 419.99,316.67 423.06,326.05 426.13,322.72 429.20,335.43 432.27,338.14 435.34,349.82 438.41,348.78 441.48,356.07 444.55,345.23 447.62,346.69 450.69,357.11 453.76,358.78 456.83,365.03 459.90,360.24 462.97,349.61 466.04,374.62 469.11,373.79 472.17,380.25 475.24,377.96 478.31,382.54 481.38,374.83 484.45,386.50 487.52,375.25 490.59,396.09 493.66,381.71 496.73,392.34 499.80,395.88 502.87,396.30 505.94,395.47 509.01,417.35 512.08,404.64 515.15,421.32 518.22,413.60 521.29,408.18 524.36,413.19 527.43,410.06 530.50,414.23 533.57,402.14 536.64,413.60 539.71,424.44 542.78,422.77 545.85,421.94 548.92,434.24 551.98,423.82 555.05,440.08 558.12,439.03 561.19,446.75 564.26,441.74 567.33,446.95 570.40,446.54 573.47,453.83 576.54,454.88 579.61,460.71 582.68,453.83 585.75,464.26 588.82,464.46 591.89,464.88 594.96,464.88 598.03,463.21 601.10,463.42 604.17,472.18 607.24,473.22 610.31,472.59 613.38,475.93 616.45,473.84 619.52,479.26 622.59,482.81 625.66,484.47 628.72,480.93 631.79,488.85 634.86,493.02 637.93,487.39 641.00,491.35 644.07,494.06 647.14,498.65 650.21,491.15 653.28,489.06 656.35,487.81 659.42,502.82 662.49,503.65 665.56,513.24 668.63,503.86 671.70,513.24 674.77,506.36 677.84,515.12 680.91,509.28 683.98,507.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,142.62 76.19,124.90 79.26,110.10 82.33,125.94 85.40,120.73 88.47,101.97 91.54,131.57 94.61,123.65 97.68,121.78 100.75,120.32 103.82,125.94 106.89,117.19 109.96,105.31 113.03,115.11 116.10,114.90 119.17,122.61 122.24,106.56 125.31,120.52 128.38,118.23 131.45,107.81 134.52,80.92 137.59,107.81 140.66,102.18 143.73,101.35 146.80,92.80 149.87,98.22 152.94,93.01 156.00,106.98 159.07,91.55 162.14,69.66 165.21,104.27 168.28,65.08 171.35,63.62 174.42,76.33 177.49,78.63 180.56,86.55 183.63,84.25 186.70,91.13 189.77,74.67 192.84,87.80 195.91,83.42 198.98,78.00 202.05,72.79 205.12,93.01 208.19,71.33 211.26,73.83 214.33,94.26 217.40,97.39 220.47,122.61 223.54,101.14 226.61,90.51 229.68,84.88 232.75,110.94 235.81,115.52 238.88,83.00 241.95,112.81 245.02,94.89 248.09,111.77 251.16,115.31 254.23,116.77 257.30,113.23 260.37,110.31 263.44,120.94 266.51,139.49 269.58,128.03 272.65,131.16 275.72,131.99 278.79,126.15 281.86,140.12 284.93,153.46 288.00,149.50 291.07,160.76 294.14,154.29 297.21,155.54 300.28,164.51 303.35,150.12 306.42,181.60 309.49,175.14 312.56,177.22 315.62,176.81 318.69,183.89 321.76,181.81 324.83,197.44 327.90,193.69 330.97,201.82 334.04,206.61 337.11,200.57 340.18,224.12 343.25,217.04 346.32,210.78 349.39,224.75 352.46,233.71 355.53,227.67 358.60,223.50 361.67,231.21 364.74,238.92 367.81,245.18 370.88,232.25 373.95,264.98 377.02,257.27 380.09,257.48 383.16,258.93 386.23,279.78 389.30,265.60 392.36,277.69 395.43,298.96 398.50,283.32 401.57,296.66 404.64,300.83 407.71,303.54 410.78,305.42 413.85,308.34 416.92,322.30 419.99,317.51 423.06,326.47 426.13,331.89 429.20,337.10 432.27,337.52 435.34,328.14 438.41,336.69 441.48,346.90 444.55,355.45 447.62,347.32 450.69,362.12 453.76,354.61 456.83,356.49 459.90,351.69 462.97,367.54 466.04,381.71 469.11,376.71 472.17,367.33 475.24,380.46 478.31,368.58 481.38,382.96 484.45,370.87 487.52,383.59 490.59,390.26 493.66,390.46 496.73,390.88 499.80,395.88 502.87,389.01 505.94,398.18 509.01,410.48 512.08,402.76 515.15,404.85 518.22,411.10 521.29,412.14 524.36,411.52 527.43,415.48 530.50,428.61 533.57,434.03 536.64,431.74 539.71,425.28 542.78,422.36 545.85,431.53 548.92,433.41 551.98,441.33 555.05,437.37 558.12,427.36 561.19,438.41 564.26,441.95 567.33,449.66 570.40,447.37 573.47,448.62 576.54,446.12 579.61,458.00 582.68,454.25 585.75,453.42 588.82,466.34 591.89,466.13 594.96,467.38 598.03,465.30 601.10,470.51 604.17,476.76 607.24,478.43 610.31,470.51 613.38,479.47 616.45,483.64 619.52,477.18 622.59,488.64 625.66,485.10 628.72,486.98 631.79,482.60 634.86,487.39 637.93,487.81 641.00,486.56 644.07,491.56 647.14,496.98 650.21,488.23 653.28,502.19 656.35,501.57 659.42,501.15 662.49,494.69 665.56,503.86 668.63,506.36 671.70,513.03 674.77,498.65 677.84,509.28 680.91,511.36 683.98,508.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,145.54 76.19,140.12 79.26,126.36 82.33,113.65 85.40,132.41 88.47,119.27 91.54,133.03 94.61,136.37 97.68,118.44 100.75,126.15 103.82,86.96 106.89,101.35 109.96,110.31 113.03,110.94 116.10,119.48 119.17,100.31 122.24,115.31 125.31,97.80 128.38,98.85 131.45,108.43 134.52,98.22 137.59,115.31 140.66,83.84 143.73,91.34 146.80,95.72 149.87,92.38 152.94,78.84 156.00,97.18 159.07,97.60 162.14,94.68 165.21,73.00 168.28,89.47 171.35,98.43 174.42,83.21 177.49,81.13 180.56,70.29 183.63,97.60 186.70,78.42 189.77,75.92 192.84,73.83 195.91,80.71 198.98,99.26 202.05,90.93 205.12,93.63 208.19,84.05 211.26,97.60 214.33,74.87 217.40,77.17 220.47,87.80 223.54,95.72 226.61,92.38 229.68,98.64 232.75,94.47 235.81,101.97 238.88,92.38 241.95,80.29 245.02,101.76 248.09,94.68 251.16,105.72 254.23,99.89 257.30,106.35 260.37,106.56 263.44,106.98 266.51,122.19 269.58,130.95 272.65,136.58 275.72,127.20 278.79,134.07 281.86,123.86 284.93,127.82 288.00,157.63 291.07,148.46 294.14,159.09 297.21,156.59 300.28,167.01 303.35,159.30 306.42,162.84 309.49,186.60 312.56,181.81 315.62,188.69 318.69,199.32 321.76,199.32 324.83,206.61 327.90,209.95 330.97,219.33 334.04,230.59 337.11,214.53 340.18,231.21 343.25,230.79 346.32,227.67 349.39,217.04 352.46,220.58 355.53,237.67 358.60,235.59 361.67,249.97 364.74,256.43 367.81,238.92 370.88,256.64 373.95,261.64 377.02,253.10 380.09,266.23 383.16,267.69 386.23,276.44 389.30,286.24 392.36,266.23 395.43,290.20 398.50,291.87 401.57,303.96 404.64,300.00 407.71,314.80 410.78,318.13 413.85,316.05 416.92,308.13 419.99,321.26 423.06,315.22 426.13,315.22 429.20,332.31 432.27,337.10 435.34,333.14 438.41,333.35 441.48,345.44 444.55,354.40 447.62,332.93 450.69,359.82 453.76,347.32 456.83,360.87 459.90,360.66 462.97,376.50 466.04,367.74 469.11,362.53 472.17,382.13 475.24,381.29 478.31,383.38 481.38,381.29 484.45,381.71 487.52,383.38 490.59,395.47 493.66,404.64 496.73,395.26 499.80,391.30 502.87,402.55 505.94,387.96 509.01,399.01 512.08,408.39 515.15,415.69 518.22,407.56 521.29,421.11 524.36,417.35 527.43,417.98 530.50,425.28 533.57,424.44 536.64,425.48 539.71,431.32 542.78,431.74 545.85,432.99 548.92,428.40 551.98,440.49 555.05,437.78 558.12,436.74 561.19,440.91 564.26,446.95 567.33,444.66 570.40,447.58 573.47,452.79 576.54,451.12 579.61,454.67 582.68,455.71 585.75,456.96 588.82,456.33 591.89,466.13 594.96,470.72 598.03,465.09 601.10,475.09 604.17,471.97 607.24,469.26 610.31,482.81 613.38,476.55 616.45,468.42 619.52,477.60 622.59,480.31 625.66,483.02 628.72,488.02 631.79,481.97 634.86,479.68 637.93,474.47 641.00,494.90 644.07,491.35 647.14,490.10 650.21,490.10 653.28,498.86 656.35,502.40 659.42,494.69 662.49,499.27 665.56,495.31 668.63,501.57 671.70,503.03 674.77,509.28 677.84,515.53 680.91,505.95 683.98,508.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,143.87 76.19,139.29 79.26,119.07 82.33,127.40 85.40,133.24 88.47,129.70 91.54,110.31 94.61,111.77 97.68,113.85 100.75,109.48 103.82,88.01 106.89,110.94 109.96,102.39 113.03,123.86 116.10,101.97 119.17,88.01 122.24,92.18 125.31,91.97 128.38,93.63 131.45,119.27 134.52,93.01 137.59,105.31 140.66,91.13 143.73,114.06 146.80,95.51 149.87,92.38 152.94,89.67 156.00,111.56 159.07,86.34 162.14,98.85 165.21,88.63 168.28,74.46 171.35,96.34 174.42,84.25 177.49,96.55 180.56,88.01 183.63,76.54 186.70,86.55 189.77,76.96 192.84,72.79 195.91,67.58 198.98,88.84 202.05,77.79 205.12,81.13 208.19,84.25 211.26,102.60 214.33,84.88 217.40,86.76 220.47,90.30 223.54,81.75 226.61,89.47 229.68,82.80 232.75,101.14 235.81,75.92 238.88,99.68 241.95,74.46 245.02,103.43 248.09,109.06 251.16,93.43 254.23,111.56 257.30,96.55 260.37,104.06 263.44,130.11 266.51,120.94 269.58,129.07 272.65,93.01 275.72,133.45 278.79,123.44 281.86,129.90 284.93,136.58 288.00,128.86 291.07,153.04 294.14,159.30 297.21,150.75 300.28,152.83 303.35,165.76 306.42,159.50 309.49,176.81 312.56,181.18 315.62,182.85 318.69,188.06 321.76,213.70 324.83,203.90 327.90,184.31 330.97,200.57 334.04,207.03 337.11,214.33 340.18,210.57 343.25,219.75 346.32,224.75 349.39,226.62 352.46,234.55 355.53,228.92 358.60,234.96 361.67,253.51 364.74,239.55 367.81,262.48 370.88,261.23 373.95,270.40 377.02,260.18 380.09,259.77 383.16,277.49 386.23,263.52 389.30,280.82 392.36,289.16 395.43,295.00 398.50,295.41 401.57,281.24 404.64,292.29 407.71,290.83 410.78,291.87 413.85,307.29 416.92,312.30 419.99,315.22 423.06,321.05 426.13,328.76 429.20,337.73 432.27,323.34 435.34,333.98 438.41,344.40 441.48,336.27 444.55,346.27 447.62,347.52 450.69,351.07 453.76,370.45 456.83,354.40 459.90,354.40 462.97,374.21 466.04,368.99 469.11,355.03 472.17,360.45 475.24,379.21 478.31,385.05 481.38,390.67 484.45,388.59 487.52,384.84 490.59,380.04 493.66,391.09 496.73,389.01 499.80,396.93 502.87,395.88 505.94,393.80 509.01,400.89 512.08,396.51 515.15,410.89 518.22,413.81 521.29,412.14 524.36,416.94 527.43,427.15 530.50,420.48 533.57,430.28 536.64,429.65 539.71,426.94 542.78,428.19 545.85,433.61 548.92,427.57 551.98,434.03 555.05,452.58 558.12,442.37 561.19,444.04 564.26,452.17 567.33,458.42 570.40,459.25 573.47,451.96 576.54,444.66 579.61,459.04 582.68,451.54 585.75,464.46 588.82,458.42 591.89,461.34 594.96,452.58 598.03,460.71 601.10,464.05 604.17,469.26 607.24,472.80 610.31,470.51 613.38,475.93 616.45,472.38 619.52,488.23 622.59,478.85 625.66,486.14 628.72,487.60 631.79,482.39 634.86,489.27 637.93,489.27 641.00,486.35 644.07,495.31 647.14,486.77 650.21,481.56 653.28,503.65 656.35,502.40 659.42,493.65 662.49,501.98 665.56,502.19 668.63,509.49 671.70,501.36 674.77,501.98 677.84,511.57 680.91,498.65 683.98,507.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,104.89 76.19,121.78 79.26,117.40 82.33,115.52 85.40,126.36 88.47,120.11 91.54,98.64 94.61,128.65 97.68,106.77 100.75,115.73 103.82,107.81 106.89,115.94 109.96,105.31 113.03,110.31 116.10,99.47 119.17,120.11 122.24,112.40 125.31,114.69 128.38,124.49 131.45,109.48 134.52,113.65 137.59,99.89 140.66,110.52 143.73,105.72 146.80,82.59 149.87,101.76 152.94,115.94 156.00,89.26 159.07,86.76 162.14,100.72 165.21,82.17 168.28,72.79 171.35,93.01 174.42,100.93 177.49,93.84 180.56,102.81 183.63,97.80 186.70,92.80 189.77,87.80 192.84,84.25 195.91,99.26 198.98,78.84 202.05,94.47 205.12,74.04 208.19,85.09 211.26,79.46 214.33,83.42 217.40,79.04 220.47,84.05 223.54,76.75 226.61,84.67 229.68,81.54 232.75,77.79 235.81,78.21 238.88,101.97 241.95,111.14 245.02,112.40 248.09,99.05 251.16,102.60 254.23,112.60 257.30,119.69 260.37,125.74 263.44,108.43 266.51,135.95 269.58,140.95 272.65,144.91 275.72,128.03 278.79,137.62 281.86,131.36 284.93,150.33 288.00,145.33 291.07,143.25 294.14,151.38 297.21,142.20 300.28,152.21 303.35,177.22 306.42,169.30 309.49,174.51 312.56,180.77 315.62,164.92 318.69,184.10 321.76,193.90 324.83,202.44 327.90,188.90 330.97,216.41 334.04,192.86 337.11,207.45 340.18,215.16 343.25,198.28 346.32,217.04 349.39,231.21 352.46,231.84 355.53,222.04 358.60,231.63 361.67,244.76 364.74,241.84 367.81,246.22 370.88,257.89 373.95,250.80 377.02,256.22 380.09,269.77 383.16,270.82 386.23,289.37 389.30,285.62 392.36,272.48 395.43,276.65 398.50,293.12 401.57,293.12 404.64,296.66 407.71,312.30 410.78,309.80 413.85,314.80 416.92,322.09 419.99,320.43 423.06,318.76 426.13,328.35 429.20,343.56 432.27,348.15 435.34,334.60 438.41,349.40 441.48,350.23 444.55,356.28 447.62,357.32 450.69,354.61 453.76,367.12 456.83,356.70 459.90,372.96 462.97,353.99 466.04,366.28 469.11,377.96 472.17,380.88 475.24,375.25 478.31,391.51 481.38,397.34 484.45,390.67 487.52,381.92 490.59,392.13 493.66,386.09 496.73,402.76 499.80,396.51 502.87,400.47 505.94,395.47 509.01,409.43 512.08,404.85 515.15,400.68 518.22,416.31 521.29,416.31 524.36,423.40 527.43,417.56 530.50,413.19 533.57,425.90 536.64,419.23 539.71,426.94 542.78,430.49 545.85,435.07 548.92,443.83 551.98,446.54 555.05,436.74 558.12,441.53 561.19,445.29 564.26,439.03 567.33,454.46 570.40,446.95 573.47,450.08 576.54,460.09 579.61,449.46 582.68,451.96 585.75,459.46 588.82,457.59 591.89,459.25 594.96,457.79 598.03,452.17 601.10,474.26 604.17,475.30 607.24,473.43 610.31,476.76 613.38,473.01 616.45,477.39 619.52,472.38 622.59,488.02 625.66,483.02 628.72,481.97 631.79,491.77 634.86,493.86 637.93,480.51 641.00,489.48 644.07,491.56 647.14,490.31 650.21,488.85 653.28,500.11 656.35,506.15 659.42,500.32 662.49,499.48 665.56,502.61 668.63,497.19 671.70,499.07 674.77,508.03 677.84,508.86 680.91,504.07 683.98,513.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,132.82 76.19,125.74 79.26,125.11 82.33,113.44 85.40,118.65 88.47,101.56 91.54,104.47 94.61,118.44 97.68,126.78 100.75,109.69 103.82,104.68 106.89,103.85 109.96,125.53 113.03,76.13 116.10,100.72 119.17,104.47 122.24,96.34 125.31,92.18 128.38,92.18 131.45,106.77 134.52,95.72 137.59,90.72 140.66,95.93 143.73,90.09 146.80,81.13 149.87,108.02 152.94,87.80 156.00,100.10 159.07,106.35 162.14,98.43 165.21,98.64 168.28,76.75 171.35,94.47 174.42,73.83 177.49,81.13 180.56,80.92 183.63,82.80 186.70,84.88 189.77,63.62 192.84,70.91 195.91,66.75 198.98,83.00 202.05,94.47 205.12,74.87 208.19,96.76 211.26,100.51 214.33,83.84 217.40,83.84 220.47,83.63 223.54,91.13 226.61,97.80 229.68,85.51 232.75,97.18 235.81,105.93 238.88,101.35 241.95,102.39 245.02,105.52 248.09,107.39 251.16,100.31 254.23,114.27 257.30,101.14 260.37,102.18 263.44,135.74 266.51,133.03 269.58,132.41 272.65,118.86 275.72,129.28 278.79,147.00 281.86,138.66 284.93,129.49 288.00,128.86 291.07,135.32 294.14,162.42 297.21,132.82 300.28,137.62 303.35,155.54 306.42,164.09 309.49,182.23 312.56,184.52 315.62,177.64 318.69,183.06 321.76,188.69 324.83,195.15 327.90,204.74 330.97,227.25 334.04,230.17 337.11,209.74 340.18,222.04 343.25,208.07 346.32,228.08 349.39,229.54 352.46,223.50 355.53,244.55 358.60,227.25 361.67,244.34 364.74,257.48 367.81,254.77 370.88,268.11 373.95,264.35 377.02,258.52 380.09,256.64 383.16,278.95 386.23,277.07 389.30,277.07 392.36,277.07 395.43,298.75 398.50,294.37 401.57,298.54 404.64,278.95 407.71,293.33 410.78,316.05 413.85,302.29 416.92,310.63 419.99,313.96 423.06,304.17 426.13,337.52 429.20,323.97 432.27,335.43 435.34,333.35 438.41,353.57 441.48,347.11 444.55,353.36 447.62,357.11 450.69,352.53 453.76,355.65 456.83,366.70 459.90,347.52 462.97,382.34 466.04,376.92 469.11,387.13 472.17,385.05 475.24,379.83 478.31,378.17 481.38,378.37 484.45,391.30 487.52,389.42 490.59,385.05 493.66,387.34 496.73,390.05 499.80,379.63 502.87,407.97 505.94,407.14 509.01,396.72 512.08,398.18 515.15,413.19 518.22,405.68 521.29,403.81 524.36,402.55 527.43,413.60 530.50,414.85 533.57,429.03 536.64,418.19 539.71,432.78 542.78,424.03 545.85,427.99 548.92,433.20 551.98,441.74 555.05,434.03 558.12,442.79 561.19,431.95 564.26,429.03 567.33,455.29 570.40,453.21 573.47,450.29 576.54,446.12 579.61,444.87 582.68,454.67 585.75,465.92 588.82,462.59 591.89,460.29 594.96,474.05 598.03,474.47 601.10,478.64 604.17,471.13 607.24,468.63 610.31,474.05 613.38,467.59 616.45,481.56 619.52,485.73 622.59,477.80 625.66,487.39 628.72,485.93 631.79,487.81 634.86,487.60 637.93,479.06 641.00,489.89 644.07,484.89 647.14,492.40 650.21,492.81 653.28,505.11 656.35,500.53 659.42,493.44 662.49,504.90 665.56,500.11 668.63,501.78 671.70,505.11 674.77,509.70 677.84,508.86 680.91,505.32 683.98,508.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,135.53 76.19,140.12 79.26,130.74 82.33,117.81 85.40,135.53 88.47,111.77 91.54,118.44 94.61,142.83 97.68,121.78 100.75,109.27 103.82,129.28 106.89,130.32 109.96,116.15 113.03,125.74 116.10,99.26 119.17,93.63 122.24,126.57 125.31,101.76 128.38,110.31 131.45,97.18 134.52,95.30 137.59,106.77 140.66,94.05 143.73,88.42 146.80,96.97 149.87,86.13 152.94,111.56 156.00,113.85 159.07,80.71 162.14,92.80 165.21,101.35 168.28,89.05 171.35,89.05 174.42,80.09 177.49,79.46 180.56,84.46 183.63,103.85 186.70,96.14 189.77,90.30 192.84,100.93 195.91,93.22 198.98,108.43 202.05,83.42 205.12,88.63 208.19,95.93 211.26,86.34 214.33,77.17 217.40,96.34 220.47,79.25 223.54,82.80 226.61,89.47 229.68,106.77 232.75,88.63 235.81,89.47 238.88,87.59 241.95,98.64 245.02,104.47 248.09,100.31 251.16,106.35 254.23,103.43 257.30,95.30 260.37,119.69 263.44,116.77 266.51,112.19 269.58,122.61 272.65,136.16 275.72,112.81 278.79,139.49 281.86,138.66 284.93,130.11 288.00,126.36 291.07,139.29 294.14,148.04 297.21,152.21 300.28,150.12 303.35,148.46 306.42,177.85 309.49,183.27 312.56,163.05 315.62,171.18 318.69,172.22 321.76,182.43 324.83,191.81 327.90,206.82 330.97,210.37 334.04,188.69 337.11,212.03 340.18,216.83 343.25,221.21 346.32,217.24 349.39,222.25 352.46,225.17 355.53,232.67 358.60,237.88 361.67,244.13 364.74,256.64 367.81,260.81 370.88,264.77 373.95,260.39 377.02,252.47 380.09,273.94 383.16,276.03 386.23,283.11 389.30,276.44 392.36,294.16 395.43,305.84 398.50,297.08 401.57,306.46 404.64,289.99 407.71,302.71 410.78,281.86 413.85,307.71 416.92,312.92 419.99,315.01 423.06,319.80 426.13,328.76 429.20,327.31 432.27,348.78 435.34,332.31 438.41,335.23 441.48,349.61 444.55,331.06 447.62,353.57 450.69,353.78 453.76,354.40 456.83,362.12 459.90,359.41 462.97,363.99 466.04,378.79 469.11,378.37 472.17,366.49 475.24,377.96 478.31,364.62 481.38,387.76 484.45,373.37 487.52,394.22 490.59,403.81 493.66,395.68 496.73,397.97 499.80,390.05 502.87,386.71 505.94,396.30 509.01,406.52 512.08,415.06 515.15,403.39 518.22,416.94 521.29,409.85 524.36,416.94 527.43,421.94 530.50,418.81 533.57,422.57 536.64,427.78 539.71,428.82 542.78,425.69 545.85,431.74 548.92,434.86 551.98,431.32 555.05,447.79 558.12,434.66 561.19,443.62 564.26,444.04 567.33,442.58 570.40,437.99 573.47,460.09 576.54,453.21 579.61,461.13 582.68,458.00 585.75,453.00 588.82,456.75 591.89,465.09 594.96,473.22 598.03,470.30 601.10,463.84 604.17,463.21 607.24,464.05 610.31,479.89 613.38,473.64 616.45,489.27 619.52,489.89 622.59,478.64 625.66,469.05 628.72,490.52 631.79,485.10 634.86,490.10 637.93,491.56 641.00,501.57 644.07,481.77 647.14,494.90 650.21,494.90 653.28,497.40 656.35,504.49 659.42,493.23 662.49,488.44 665.56,506.36 668.63,493.86 671.70,501.15 674.77,512.82 677.84,505.74 680.91,504.69 683.98,513.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,125.53 76.19,120.52 79.26,129.49 82.33,141.58 85.40,116.98 88.47,120.52 91.54,114.90 94.61,113.65 97.68,124.90 100.75,111.35 103.82,125.53 106.89,110.10 109.96,115.73 113.03,119.27 116.10,128.86 119.17,126.57 122.24,112.40 125.31,97.80 128.38,95.93 131.45,106.98 134.52,99.68 137.59,99.05 140.66,115.31 143.73,60.28 146.80,99.89 149.87,99.68 152.94,98.64 156.00,89.05 159.07,74.67 162.14,105.72 165.21,95.72 168.28,73.83 171.35,90.09 174.42,66.54 177.49,80.92 180.56,98.22 183.63,81.13 186.70,83.21 189.77,81.96 192.84,89.88 195.91,82.38 198.98,101.76 202.05,113.23 205.12,86.76 208.19,80.50 211.26,92.18 214.33,77.79 217.40,86.96 220.47,90.09 223.54,94.68 226.61,75.29 229.68,76.33 232.75,95.09 235.81,80.29 238.88,87.59 241.95,75.71 245.02,115.31 248.09,103.85 251.16,101.14 254.23,98.64 257.30,103.85 260.37,94.05 263.44,127.61 266.51,104.06 269.58,104.27 272.65,106.35 275.72,115.73 278.79,145.33 281.86,138.45 284.93,138.03 288.00,144.29 291.07,169.93 294.14,150.54 297.21,155.34 300.28,165.97 303.35,167.63 306.42,169.09 309.49,171.80 312.56,165.76 315.62,166.80 318.69,182.64 321.76,183.89 324.83,198.48 327.90,212.03 330.97,194.52 334.04,212.87 337.11,202.03 340.18,218.91 343.25,228.29 346.32,237.05 349.39,230.79 352.46,239.76 355.53,238.51 358.60,231.84 361.67,239.97 364.74,242.47 367.81,243.51 370.88,256.02 373.95,258.93 377.02,273.32 380.09,261.64 383.16,284.99 386.23,259.98 389.30,282.49 392.36,283.74 395.43,298.33 398.50,293.95 401.57,280.82 404.64,291.24 407.71,290.62 410.78,286.66 413.85,306.46 416.92,306.25 419.99,307.71 423.06,324.39 426.13,338.77 429.20,332.52 432.27,337.52 435.34,327.51 438.41,347.32 441.48,342.10 444.55,338.98 447.62,351.69 450.69,335.43 453.76,358.36 456.83,368.79 459.90,359.82 462.97,365.66 466.04,369.62 469.11,363.37 472.17,376.92 475.24,392.97 478.31,379.63 481.38,378.17 484.45,388.38 487.52,376.08 490.59,383.38 493.66,388.17 496.73,398.59 499.80,394.22 502.87,381.71 505.94,405.47 509.01,405.26 512.08,403.81 515.15,408.39 518.22,413.39 521.29,412.35 524.36,405.26 527.43,419.86 530.50,420.90 533.57,421.32 536.64,425.07 539.71,422.57 542.78,437.16 545.85,431.95 548.92,426.94 551.98,440.08 555.05,434.24 558.12,436.95 561.19,444.87 564.26,448.62 567.33,449.87 570.40,447.16 573.47,463.21 576.54,450.91 579.61,451.75 582.68,455.71 585.75,465.51 588.82,455.71 591.89,464.67 594.96,469.26 598.03,486.56 601.10,460.71 604.17,464.67 607.24,475.72 610.31,467.59 613.38,480.10 616.45,485.73 619.52,471.76 622.59,475.51 625.66,483.43 628.72,480.31 631.79,496.56 634.86,501.57 637.93,489.06 641.00,498.02 644.07,486.56 647.14,502.40 650.21,492.19 653.28,498.44 656.35,499.27 659.42,501.78 662.49,504.07 665.56,508.65 668.63,508.86 671.70,511.36 674.77,507.82 677.84,511.36 680.91,508.86 683.98,507.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,126.15 76.19,129.90 79.26,122.61 82.33,118.65 85.40,126.78 88.47,130.32 91.54,130.74 94.61,129.49 97.68,114.90 100.75,111.35 103.82,125.74 106.89,89.88 109.96,87.38 113.03,109.89 116.10,83.42 119.17,109.27 122.24,105.93 125.31,99.26 128.38,98.01 131.45,93.01 134.52,89.47 137.59,97.39 140.66,85.51 143.73,100.10 146.80,101.35 149.87,84.46 152.94,103.22 156.00,91.97 159.07,94.89 162.14,83.42 165.21,79.25 168.28,68.20 171.35,88.22 174.42,80.71 177.49,74.87 180.56,70.91 183.63,73.83 186.70,73.00 189.77,81.96 192.84,94.47 195.91,73.00 198.98,93.84 202.05,78.42 205.12,83.84 208.19,89.47 211.26,82.38 214.33,78.42 217.40,95.93 220.47,98.85 223.54,83.21 226.61,96.14 229.68,102.18 232.75,103.02 235.81,98.43 238.88,90.51 241.95,76.13 245.02,110.31 248.09,116.98 251.16,119.90 254.23,98.22 257.30,102.18 260.37,111.14 263.44,119.07 266.51,129.07 269.58,127.20 272.65,128.24 275.72,144.08 278.79,136.37 281.86,138.03 284.93,122.82 288.00,140.54 291.07,125.11 294.14,158.88 297.21,135.53 300.28,158.25 303.35,154.08 306.42,172.22 309.49,161.80 312.56,182.23 315.62,188.69 318.69,172.22 321.76,192.02 324.83,191.40 327.90,182.85 330.97,208.70 334.04,197.44 337.11,216.62 340.18,224.75 343.25,226.62 346.32,203.07 349.39,223.08 352.46,242.05 355.53,244.76 358.60,249.55 361.67,234.75 364.74,240.17 367.81,243.93 370.88,245.80 373.95,268.52 377.02,264.98 380.09,263.52 383.16,285.82 386.23,276.65 389.30,277.90 392.36,293.12 395.43,287.70 398.50,282.49 401.57,304.58 404.64,306.88 407.71,294.16 410.78,306.88 413.85,307.71 416.92,295.83 419.99,318.97 423.06,312.71 426.13,314.59 429.20,330.43 432.27,334.18 435.34,333.56 438.41,335.23 441.48,339.81 444.55,342.73 447.62,343.98 450.69,357.11 453.76,350.03 456.83,349.40 459.90,361.91 462.97,360.87 466.04,361.28 469.11,370.04 472.17,373.16 475.24,389.84 478.31,381.92 481.38,382.96 484.45,382.34 487.52,393.59 490.59,404.85 493.66,388.80 496.73,395.47 499.80,400.26 502.87,405.26 505.94,382.34 509.01,404.64 512.08,405.26 515.15,413.19 518.22,420.06 521.29,412.77 524.36,424.03 527.43,421.52 530.50,430.28 533.57,420.69 536.64,425.48 539.71,427.36 542.78,432.78 545.85,426.32 548.92,433.61 551.98,441.74 555.05,447.58 558.12,437.16 561.19,451.33 564.26,442.58 567.33,451.54 570.40,447.79 573.47,452.17 576.54,452.79 579.61,457.17 582.68,456.75 585.75,459.04 588.82,459.67 591.89,460.71 594.96,461.75 598.03,474.89 601.10,464.88 604.17,484.06 607.24,463.63 610.31,472.38 613.38,472.38 616.45,476.35 619.52,470.51 622.59,481.97 625.66,482.60 628.72,481.77 631.79,487.81 634.86,484.68 637.93,484.89 641.00,489.27 644.07,494.48 647.14,490.10 650.21,495.11 653.28,493.86 656.35,501.98 659.42,493.23 662.49,493.44 665.56,497.82 668.63,497.82 671.70,503.24 674.77,507.82 677.84,514.07 680.91,508.45 683.98,510.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,147.41 76.19,133.45 79.26,123.03 82.33,115.73 85.40,119.69 88.47,128.45 91.54,126.99 94.61,122.40 97.68,99.68 100.75,117.19 103.82,95.30 106.89,127.82 109.96,103.85 113.03,114.90 116.10,124.28 119.17,109.89 122.24,99.05 125.31,98.01 128.38,114.48 131.45,94.89 134.52,112.19 137.59,104.27 140.66,87.38 143.73,89.67 146.80,102.60 149.87,99.89 152.94,82.59 156.00,91.97 159.07,85.71 162.14,93.22 165.21,95.51 168.28,102.81 171.35,101.76 174.42,87.38 177.49,88.42 180.56,73.83 183.63,98.85 186.70,104.68 189.77,98.01 192.84,105.72 195.91,97.18 198.98,98.85 202.05,86.96 205.12,69.25 208.19,88.01 211.26,76.96 214.33,82.59 217.40,95.72 220.47,84.67 223.54,93.43 226.61,81.75 229.68,92.38 232.75,90.93 235.81,97.80 238.88,103.02 241.95,106.35 245.02,99.26 248.09,100.51 251.16,89.47 254.23,116.15 257.30,122.61 260.37,106.98 263.44,124.69 266.51,110.10 269.58,124.07 272.65,118.23 275.72,133.45 278.79,124.28 281.86,128.45 284.93,125.53 288.00,131.78 291.07,153.25 294.14,158.88 297.21,165.97 300.28,164.72 303.35,174.72 306.42,181.60 309.49,178.26 312.56,178.06 315.62,173.47 318.69,180.97 321.76,189.31 324.83,189.73 327.90,205.15 330.97,199.53 334.04,206.82 337.11,202.03 340.18,205.78 343.25,223.50 346.32,226.21 349.39,222.25 352.46,234.13 355.53,241.63 358.60,231.00 361.67,246.64 364.74,244.34 367.81,265.60 370.88,259.35 373.95,257.27 377.02,243.72 380.09,243.93 383.16,281.24 386.23,278.53 389.30,290.41 392.36,278.53 395.43,292.91 398.50,293.75 401.57,296.87 404.64,289.58 407.71,309.80 410.78,317.09 413.85,315.22 416.92,310.63 419.99,320.63 423.06,320.63 426.13,326.68 429.20,330.64 432.27,340.23 435.34,335.02 438.41,331.89 441.48,334.81 444.55,358.36 447.62,355.45 450.69,359.20 453.76,370.04 456.83,371.70 459.90,376.92 462.97,361.49 466.04,385.67 469.11,367.74 472.17,373.37 475.24,383.79 478.31,391.72 481.38,391.92 484.45,379.00 487.52,396.09 490.59,402.55 493.66,402.55 496.73,403.39 499.80,391.92 502.87,407.77 505.94,393.17 509.01,407.56 512.08,405.47 515.15,402.35 518.22,412.56 521.29,411.73 524.36,415.06 527.43,412.77 530.50,411.94 533.57,421.11 536.64,417.15 539.71,427.99 542.78,427.15 545.85,434.86 548.92,434.86 551.98,425.07 555.05,432.78 558.12,440.28 561.19,446.54 564.26,453.83 567.33,444.66 570.40,443.83 573.47,449.87 576.54,464.46 579.61,447.37 582.68,466.76 585.75,466.76 588.82,452.17 591.89,468.63 594.96,467.38 598.03,468.63 601.10,465.51 604.17,478.01 607.24,473.43 610.31,480.31 613.38,475.72 616.45,480.31 619.52,481.56 622.59,478.43 625.66,490.94 628.72,494.27 631.79,479.47 634.86,486.56 637.93,496.77 641.00,495.94 644.07,496.98 647.14,491.15 650.21,499.48 653.28,499.27 656.35,501.78 659.42,506.15 662.49,500.32 665.56,498.44 668.63,499.90 671.70,510.32 674.77,506.78 677.84,519.49 680.91,513.24 683.98,518.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,134.28 76.19,134.07 79.26,132.41 82.33,112.40 85.40,109.06 88.47,116.36 91.54,120.73 94.61,115.73 97.68,94.47 100.75,121.98 103.82,111.14 106.89,99.47 109.96,79.04 113.03,112.19 116.10,92.59 119.17,97.18 122.24,112.19 125.31,85.09 128.38,99.68 131.45,93.22 134.52,121.36 137.59,76.54 140.66,95.93 143.73,107.39 146.80,81.54 149.87,94.89 152.94,85.30 156.00,75.71 159.07,84.88 162.14,83.84 165.21,93.22 168.28,87.17 171.35,69.45 174.42,97.60 177.49,80.09 180.56,88.84 183.63,77.79 186.70,99.68 189.77,90.09 192.84,70.91 195.91,89.26 198.98,82.59 202.05,83.21 205.12,90.09 208.19,92.38 211.26,88.01 214.33,84.88 217.40,87.38 220.47,96.34 223.54,71.96 226.61,100.31 229.68,100.10 232.75,94.89 235.81,93.84 238.88,90.30 241.95,94.47 245.02,102.39 248.09,110.52 251.16,112.81 254.23,114.48 257.30,118.86 260.37,114.69 263.44,149.71 266.51,126.36 269.58,125.32 272.65,109.69 275.72,134.28 278.79,122.61 281.86,151.38 284.93,146.16 288.00,152.00 291.07,158.25 294.14,153.67 297.21,155.54 300.28,147.62 303.35,165.34 306.42,151.38 309.49,171.39 312.56,169.30 315.62,175.14 318.69,189.31 321.76,197.23 324.83,193.06 327.90,195.77 330.97,203.28 334.04,197.03 337.11,210.37 340.18,213.28 343.25,203.49 346.32,225.37 349.39,225.17 352.46,214.12 355.53,234.34 358.60,244.34 361.67,258.31 364.74,244.97 367.81,261.23 370.88,261.44 373.95,271.02 377.02,273.32 380.09,262.89 383.16,264.56 386.23,288.95 389.30,287.70 392.36,286.03 395.43,295.00 398.50,299.58 401.57,310.63 404.64,302.29 407.71,299.58 410.78,306.46 413.85,318.34 416.92,315.22 419.99,320.63 423.06,331.06 426.13,315.63 429.20,328.97 432.27,338.98 435.34,331.47 438.41,327.31 441.48,350.03 444.55,348.78 447.62,344.81 450.69,353.36 453.76,358.36 456.83,359.61 459.90,365.24 462.97,364.41 466.04,370.45 469.11,376.50 472.17,375.67 475.24,372.33 478.31,386.71 481.38,381.08 484.45,372.96 487.52,397.14 490.59,384.42 493.66,388.59 496.73,394.63 499.80,391.09 502.87,417.35 505.94,402.55 509.01,400.05 512.08,406.93 515.15,415.90 518.22,404.22 521.29,417.56 524.36,410.06 527.43,427.78 530.50,420.69 533.57,420.27 536.64,423.82 539.71,430.90 542.78,441.53 545.85,436.12 548.92,442.37 551.98,440.08 555.05,432.99 558.12,441.53 561.19,440.08 564.26,450.71 567.33,447.79 570.40,443.20 573.47,450.71 576.54,449.46 579.61,461.55 582.68,457.17 585.75,466.97 588.82,465.09 591.89,454.46 594.96,457.38 598.03,458.84 601.10,463.21 604.17,470.09 607.24,479.26 610.31,484.47 613.38,473.22 616.45,478.01 619.52,481.56 622.59,485.73 625.66,486.56 628.72,482.18 631.79,493.65 634.86,492.81 637.93,491.35 641.00,502.82 644.07,495.31 647.14,497.82 650.21,492.60 653.28,499.07 656.35,498.02 659.42,502.19 662.49,500.11 665.56,503.03 668.63,503.65 671.70,508.45 674.77,503.65 677.84,508.86 680.91,514.49 683.98,508.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,128.45 76.19,134.28 79.26,120.52 82.33,108.23 85.40,133.03 88.47,121.15 91.54,92.38 94.61,116.77 97.68,112.81 100.75,119.27 103.82,119.90 106.89,121.15 109.96,88.22 113.03,123.23 116.10,112.40 119.17,119.27 122.24,104.47 125.31,95.93 128.38,98.85 131.45,99.68 134.52,106.98 137.59,93.84 140.66,116.56 143.73,104.06 146.80,95.51 149.87,108.23 152.94,90.93 156.00,99.68 159.07,79.25 162.14,98.22 165.21,87.38 168.28,96.76 171.35,78.84 174.42,83.00 177.49,96.34 180.56,97.39 183.63,90.09 186.70,82.38 189.77,66.33 192.84,71.54 195.91,91.97 198.98,98.64 202.05,91.34 205.12,82.38 208.19,88.22 211.26,67.58 214.33,67.79 217.40,79.25 220.47,97.18 223.54,71.12 226.61,81.13 229.68,98.85 232.75,80.92 235.81,90.51 238.88,110.31 241.95,114.69 245.02,96.76 248.09,94.05 251.16,98.64 254.23,99.26 257.30,98.43 260.37,127.82 263.44,112.81 266.51,115.52 269.58,134.28 272.65,150.12 275.72,135.12 278.79,133.03 281.86,136.78 284.93,125.11 288.00,137.20 291.07,155.54 294.14,136.99 297.21,157.21 300.28,180.14 303.35,166.38 306.42,164.72 309.49,180.97 312.56,190.77 315.62,182.43 318.69,185.56 321.76,190.98 324.83,208.91 327.90,188.69 330.97,208.70 334.04,215.16 337.11,190.77 340.18,228.29 343.25,217.87 346.32,221.41 349.39,212.87 352.46,232.04 355.53,232.04 358.60,253.72 361.67,235.17 364.74,240.80 367.81,255.81 370.88,259.14 373.95,252.26 377.02,275.19 380.09,277.49 383.16,260.18 386.23,281.86 389.30,282.70 392.36,287.91 395.43,287.49 398.50,295.00 401.57,284.57 404.64,296.25 407.71,305.21 410.78,297.91 413.85,309.17 416.92,315.63 419.99,320.43 423.06,321.26 426.13,345.02 429.20,336.06 432.27,335.43 435.34,322.30 438.41,339.19 441.48,347.73 444.55,342.94 447.62,354.19 450.69,357.74 453.76,368.16 456.83,364.83 459.90,361.28 462.97,374.83 466.04,371.91 469.11,381.71 472.17,374.83 475.24,367.33 478.31,379.00 481.38,379.00 484.45,380.67 487.52,388.80 490.59,374.62 493.66,391.30 496.73,389.63 499.80,395.05 502.87,400.68 505.94,399.43 509.01,412.14 512.08,407.56 515.15,406.72 518.22,402.97 521.29,415.27 524.36,415.48 527.43,416.10 530.50,417.35 533.57,405.68 536.64,417.56 539.71,421.52 542.78,426.11 545.85,436.74 548.92,441.33 551.98,437.57 555.05,435.91 558.12,451.33 561.19,438.62 564.26,437.99 567.33,447.58 570.40,447.58 573.47,451.54 576.54,444.04 579.61,459.25 582.68,460.92 585.75,463.42 588.82,461.75 591.89,459.88 594.96,464.46 598.03,468.63 601.10,478.43 604.17,467.59 607.24,467.59 610.31,473.64 613.38,486.14 616.45,475.93 619.52,486.14 622.59,482.39 625.66,487.39 628.72,488.02 631.79,483.64 634.86,488.85 637.93,488.23 641.00,491.15 644.07,493.65 647.14,491.56 650.21,496.98 653.28,502.40 656.35,490.31 659.42,501.57 662.49,494.69 665.56,506.78 668.63,507.20 671.70,504.07 674.77,506.15 677.84,506.99 680.91,510.32 683.98,514.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,122.82 76.19,114.27 79.26,124.69 82.33,122.61 85.40,125.53 88.47,125.11 91.54,107.81 94.61,99.47 97.68,122.19 100.75,110.73 103.82,119.07 106.89,112.60 109.96,101.76 113.03,118.02 116.10,97.80 119.17,108.43 122.24,126.57 125.31,121.15 128.38,106.98 131.45,94.68 134.52,120.11 137.59,105.72 140.66,103.02 143.73,90.51 146.80,91.97 149.87,86.55 152.94,81.34 156.00,91.55 159.07,81.96 162.14,71.54 165.21,91.97 168.28,84.67 171.35,58.82 174.42,85.30 177.49,74.87 180.56,75.92 183.63,84.46 186.70,66.54 189.77,65.49 192.84,66.75 195.91,74.87 198.98,85.71 202.05,61.74 205.12,88.84 208.19,76.75 211.26,78.00 214.33,55.07 217.40,103.43 220.47,94.68 223.54,74.04 226.61,97.39 229.68,81.54 232.75,81.34 235.81,95.30 238.88,104.89 241.95,99.26 245.02,95.09 248.09,92.18 251.16,93.43 254.23,119.07 257.30,109.89 260.37,110.73 263.44,124.28 266.51,122.19 269.58,119.27 272.65,119.27 275.72,141.58 278.79,147.21 281.86,135.53 284.93,134.49 288.00,149.29 291.07,146.79 294.14,170.97 297.21,163.67 300.28,174.51 303.35,183.27 306.42,149.92 309.49,153.88 312.56,185.56 315.62,199.53 318.69,199.73 321.76,202.86 324.83,189.52 327.90,196.61 330.97,215.16 334.04,216.83 337.11,219.54 340.18,222.04 343.25,220.58 346.32,219.95 349.39,232.67 352.46,238.09 355.53,230.17 358.60,233.30 361.67,236.42 364.74,257.48 367.81,247.68 370.88,246.01 373.95,257.68 377.02,263.10 380.09,258.10 383.16,276.86 386.23,260.60 389.30,276.03 392.36,288.74 395.43,289.58 398.50,298.96 401.57,289.78 404.64,302.71 407.71,307.09 410.78,312.51 413.85,312.71 416.92,327.93 419.99,319.80 423.06,312.30 426.13,333.98 429.20,334.39 432.27,321.47 435.34,343.56 438.41,337.73 441.48,348.36 444.55,350.86 447.62,343.77 450.69,349.61 453.76,349.40 456.83,362.12 459.90,362.74 462.97,365.87 466.04,374.62 469.11,387.34 472.17,378.37 475.24,370.04 478.31,393.17 481.38,385.25 484.45,380.88 487.52,380.46 490.59,399.01 493.66,385.67 496.73,395.47 499.80,397.34 502.87,404.22 505.94,399.43 509.01,402.14 512.08,397.76 515.15,410.27 518.22,411.94 521.29,411.10 524.36,431.32 527.43,417.56 530.50,413.19 533.57,418.19 536.64,434.66 539.71,426.53 542.78,432.15 545.85,430.07 548.92,429.86 551.98,436.53 555.05,435.70 558.12,427.57 561.19,444.66 564.26,442.16 567.33,443.62 570.40,442.16 573.47,452.17 576.54,451.54 579.61,451.96 582.68,461.34 585.75,450.08 588.82,461.55 591.89,456.33 594.96,450.50 598.03,469.68 601.10,473.84 604.17,468.84 607.24,473.43 610.31,477.80 613.38,478.01 616.45,471.34 619.52,482.39 622.59,487.18 625.66,479.47 628.72,486.77 631.79,488.85 634.86,487.81 637.93,490.31 641.00,500.32 644.07,491.15 647.14,496.56 650.21,504.28 653.28,496.77 656.35,499.90 659.42,502.61 662.49,509.49 665.56,510.74 668.63,510.95 671.70,502.61 674.77,505.53 677.84,508.24 680.91,513.03 683.98,510.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,124.90 76.19,132.61 79.26,136.99 82.33,112.40 85.40,120.11 88.47,135.53 91.54,115.94 94.61,102.39 97.68,116.98 100.75,120.52 103.82,103.22 106.89,100.31 109.96,113.23 113.03,118.23 116.10,99.89 119.17,104.06 122.24,103.64 125.31,91.34 128.38,113.65 131.45,89.67 134.52,92.38 137.59,83.00 140.66,90.51 143.73,69.45 146.80,93.43 149.87,94.47 152.94,95.51 156.00,89.88 159.07,85.09 162.14,79.46 165.21,91.34 168.28,81.54 171.35,80.09 174.42,76.54 177.49,84.05 180.56,82.38 183.63,83.00 186.70,90.09 189.77,78.42 192.84,88.22 195.91,86.34 198.98,72.37 202.05,84.67 205.12,98.85 208.19,84.67 211.26,91.55 214.33,86.76 217.40,85.92 220.47,100.51 223.54,90.09 226.61,97.80 229.68,99.05 232.75,100.10 235.81,101.35 238.88,104.68 241.95,86.55 245.02,122.82 248.09,109.06 251.16,114.48 254.23,108.64 257.30,122.19 260.37,133.87 263.44,103.85 266.51,115.73 269.58,99.68 272.65,120.11 275.72,142.41 278.79,119.48 281.86,121.57 284.93,126.99 288.00,151.38 291.07,164.51 294.14,156.17 297.21,157.42 300.28,148.04 303.35,160.76 306.42,167.22 309.49,184.94 312.56,169.51 315.62,176.18 318.69,194.94 321.76,204.11 324.83,205.78 327.90,210.57 330.97,203.90 334.04,208.49 337.11,211.20 340.18,223.91 343.25,215.37 346.32,228.92 349.39,218.50 352.46,241.42 355.53,240.38 358.60,246.84 361.67,246.84 364.74,247.47 367.81,262.69 370.88,251.22 373.95,263.52 377.02,248.93 380.09,264.77 383.16,267.06 386.23,267.27 389.30,282.28 392.36,286.66 395.43,297.08 398.50,299.79 401.57,306.67 404.64,300.00 407.71,307.50 410.78,311.25 413.85,305.00 416.92,326.47 419.99,317.09 423.06,326.47 426.13,320.43 429.20,320.84 432.27,338.35 435.34,335.64 438.41,343.98 441.48,341.69 444.55,340.85 447.62,344.81 450.69,346.90 453.76,352.94 456.83,360.45 459.90,365.66 462.97,359.61 466.04,375.46 469.11,377.75 472.17,371.70 475.24,368.99 478.31,366.70 481.38,389.01 484.45,387.13 487.52,374.62 490.59,388.38 493.66,397.55 496.73,398.59 499.80,397.14 502.87,389.21 505.94,401.51 509.01,396.30 512.08,411.73 515.15,413.19 518.22,401.93 521.29,407.14 524.36,409.43 527.43,419.65 530.50,419.23 533.57,415.90 536.64,429.44 539.71,424.86 542.78,433.41 545.85,430.90 548.92,436.32 551.98,431.74 555.05,429.24 558.12,444.45 561.19,437.99 564.26,440.91 567.33,456.13 570.40,441.74 573.47,443.20 576.54,451.54 579.61,453.62 582.68,457.17 585.75,468.63 588.82,463.42 591.89,466.76 594.96,467.80 598.03,465.30 601.10,463.63 604.17,468.01 607.24,476.14 610.31,475.30 613.38,483.64 616.45,473.01 619.52,482.60 622.59,484.68 625.66,484.89 628.72,487.18 631.79,481.14 634.86,500.73 637.93,486.14 641.00,487.39 644.07,496.98 647.14,497.82 650.21,498.44 653.28,498.02 656.35,501.36 659.42,502.19 662.49,501.57 665.56,501.78 668.63,509.91 671.70,508.03 674.77,503.44 677.84,503.03 680.91,514.49 683.98,505.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,127.40 76.19,141.16 79.26,133.87 82.33,124.07 85.40,95.72 88.47,122.61 91.54,119.27 94.61,101.35 97.68,120.32 100.75,90.93 103.82,110.31 106.89,110.31 109.96,112.81 113.03,112.19 116.10,114.48 119.17,92.18 122.24,116.98 125.31,108.23 128.38,90.09 131.45,83.84 134.52,88.63 137.59,88.63 140.66,105.93 143.73,98.22 146.80,93.01 149.87,79.46 152.94,91.13 156.00,90.51 159.07,89.88 162.14,78.00 165.21,101.56 168.28,87.80 171.35,75.50 174.42,46.53 177.49,71.75 180.56,86.55 183.63,71.54 186.70,82.80 189.77,84.88 192.84,68.62 195.91,78.42 198.98,77.58 202.05,98.85 205.12,72.16 208.19,74.25 211.26,86.76 214.33,71.54 217.40,84.05 220.47,91.55 223.54,69.66 226.61,99.26 229.68,102.18 232.75,108.23 235.81,94.89 238.88,97.60 241.95,102.39 245.02,111.35 248.09,110.73 251.16,112.60 254.23,109.89 257.30,121.15 260.37,123.03 263.44,103.02 266.51,148.46 269.58,146.58 272.65,121.98 275.72,142.83 278.79,130.74 281.86,139.08 284.93,140.95 288.00,135.74 291.07,158.05 294.14,157.21 297.21,158.05 300.28,167.84 303.35,167.01 306.42,180.77 309.49,172.64 312.56,188.06 315.62,184.73 318.69,188.90 321.76,198.69 324.83,201.19 327.90,196.40 330.97,204.74 334.04,215.16 337.11,209.74 340.18,223.71 343.25,218.29 346.32,223.50 349.39,233.09 352.46,237.46 355.53,252.47 358.60,227.25 361.67,229.75 364.74,242.88 367.81,256.43 370.88,255.39 373.95,270.61 377.02,254.77 380.09,250.80 383.16,263.52 386.23,277.28 389.30,274.15 392.36,294.37 395.43,293.54 398.50,282.91 401.57,299.16 404.64,302.29 407.71,295.83 410.78,303.75 413.85,309.80 416.92,317.72 419.99,296.45 423.06,336.48 426.13,314.38 429.20,328.97 432.27,335.64 435.34,323.76 438.41,331.47 441.48,351.28 444.55,361.70 447.62,370.87 450.69,350.03 453.76,356.07 456.83,365.03 459.90,372.12 462.97,377.54 466.04,380.46 469.11,372.75 472.17,381.71 475.24,384.84 478.31,380.04 481.38,372.96 484.45,392.13 487.52,389.63 490.59,391.51 493.66,392.34 496.73,394.22 499.80,388.80 502.87,391.09 505.94,398.39 509.01,406.93 512.08,397.14 515.15,413.19 518.22,406.10 521.29,420.27 524.36,419.65 527.43,407.56 530.50,421.11 533.57,426.73 536.64,427.15 539.71,421.73 542.78,439.45 545.85,433.41 548.92,439.87 551.98,442.99 555.05,435.28 558.12,435.49 561.19,440.70 564.26,443.83 567.33,448.62 570.40,455.08 573.47,458.63 576.54,454.46 579.61,456.33 582.68,456.96 585.75,460.71 588.82,465.30 591.89,465.30 594.96,479.89 598.03,463.84 601.10,463.84 604.17,471.13 607.24,463.63 610.31,472.80 613.38,482.39 616.45,483.85 619.52,479.47 622.59,479.89 625.66,482.81 628.72,482.18 631.79,484.89 634.86,490.31 637.93,493.02 641.00,491.56 644.07,491.56 647.14,485.10 650.21,492.60 653.28,498.65 656.35,486.77 659.42,496.56 662.49,495.11 665.56,501.57 668.63,516.37 671.70,504.28 674.77,510.74 677.84,503.24 680.91,510.11 683.98,504.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,130.11 76.19,134.07 79.26,109.06 82.33,135.12 85.40,120.73 88.47,110.31 91.54,137.83 94.61,113.44 97.68,128.86 100.75,123.65 103.82,107.18 106.89,131.57 109.96,97.60 113.03,103.22 116.10,108.64 119.17,103.43 122.24,125.53 125.31,116.56 128.38,100.93 131.45,110.52 134.52,100.31 137.59,107.39 140.66,107.18 143.73,98.01 146.80,103.85 149.87,96.34 152.94,103.85 156.00,99.47 159.07,98.64 162.14,81.54 165.21,87.17 168.28,86.96 171.35,82.80 174.42,73.00 177.49,80.71 180.56,81.54 183.63,62.37 186.70,76.13 189.77,69.66 192.84,65.29 195.91,77.79 198.98,95.09 202.05,90.72 205.12,68.83 208.19,87.38 211.26,93.63 214.33,66.95 217.40,89.67 220.47,93.63 223.54,87.17 226.61,96.55 229.68,81.54 232.75,90.93 235.81,94.26 238.88,91.34 241.95,104.06 245.02,117.19 248.09,102.60 251.16,114.90 254.23,120.73 257.30,126.99 260.37,115.73 263.44,123.03 266.51,133.03 269.58,132.41 272.65,130.74 275.72,129.07 278.79,138.66 281.86,138.45 284.93,150.75 288.00,145.54 291.07,153.04 294.14,153.88 297.21,143.87 300.28,156.79 303.35,156.59 306.42,160.76 309.49,167.84 312.56,183.06 315.62,178.68 318.69,193.69 321.76,190.56 324.83,187.23 327.90,197.03 330.97,188.48 334.04,185.35 337.11,214.33 340.18,199.11 343.25,211.82 346.32,221.62 349.39,209.12 352.46,230.59 355.53,231.21 358.60,233.92 361.67,232.88 364.74,243.09 367.81,258.73 370.88,262.48 373.95,246.01 377.02,257.06 380.09,244.13 383.16,266.86 386.23,265.60 389.30,276.44 392.36,279.36 395.43,278.11 398.50,279.15 401.57,298.75 404.64,286.45 407.71,304.58 410.78,315.22 413.85,310.63 416.92,301.25 419.99,304.79 423.06,327.93 426.13,334.60 429.20,335.02 432.27,333.56 435.34,339.81 438.41,339.40 441.48,340.65 444.55,345.23 447.62,345.23 450.69,360.45 453.76,362.12 456.83,365.24 459.90,362.74 462.97,361.91 466.04,374.21 469.11,361.28 472.17,368.37 475.24,364.62 478.31,372.75 481.38,387.76 484.45,390.26 487.52,381.71 490.59,389.84 493.66,395.88 496.73,389.01 499.80,403.39 502.87,395.88 505.94,393.38 509.01,390.88 512.08,399.64 515.15,416.10 518.22,412.98 521.29,402.97 524.36,424.23 527.43,412.77 530.50,417.15 533.57,425.90 536.64,420.90 539.71,421.94 542.78,429.03 545.85,412.56 548.92,431.95 551.98,436.95 555.05,437.37 558.12,431.32 561.19,442.37 564.26,428.40 567.33,456.54 570.40,439.87 573.47,446.12 576.54,461.13 579.61,461.75 582.68,457.17 585.75,465.71 588.82,463.42 591.89,459.46 594.96,470.09 598.03,471.55 601.10,470.93 604.17,472.80 607.24,464.05 610.31,472.38 613.38,473.84 616.45,486.35 619.52,476.97 622.59,483.02 625.66,483.22 628.72,485.31 631.79,493.44 634.86,489.27 637.93,488.85 641.00,484.89 644.07,493.65 647.14,499.69 650.21,498.65 653.28,499.69 656.35,496.36 659.42,498.02 662.49,504.90 665.56,502.19 668.63,507.61 671.70,504.28 674.77,500.11 677.84,508.65 680.91,507.40 683.98,508.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,129.07 76.19,135.32 79.26,108.43 82.33,124.07 85.40,116.56 88.47,114.90 91.54,112.60 94.61,114.90 97.68,96.55 100.75,126.36 103.82,109.48 106.89,119.69 109.96,114.27 113.03,111.56 116.10,118.65 119.17,88.01 122.24,101.97 125.31,99.89 128.38,112.19 131.45,95.51 134.52,109.27 137.59,95.09 140.66,94.05 143.73,109.48 146.80,115.11 149.87,89.67 152.94,93.63 156.00,74.87 159.07,90.93 162.14,91.97 165.21,97.60 168.28,83.63 171.35,88.84 174.42,83.63 177.49,79.67 180.56,93.22 183.63,88.84 186.70,81.96 189.77,92.38 192.84,83.21 195.91,61.95 198.98,83.84 202.05,73.00 205.12,62.78 208.19,90.72 211.26,92.59 214.33,80.71 217.40,103.85 220.47,88.01 223.54,103.64 226.61,93.84 229.68,79.88 232.75,88.42 235.81,108.43 238.88,87.38 241.95,110.52 245.02,98.01 248.09,103.43 251.16,107.81 254.23,98.22 257.30,106.14 260.37,102.60 263.44,103.64 266.51,143.87 269.58,140.12 272.65,139.91 275.72,135.12 278.79,134.70 281.86,131.36 284.93,143.87 288.00,158.67 291.07,165.13 294.14,150.96 297.21,138.66 300.28,150.33 303.35,151.58 306.42,181.81 309.49,175.35 312.56,173.89 315.62,190.98 318.69,183.48 321.76,187.23 324.83,197.44 327.90,197.44 330.97,209.53 334.04,205.99 337.11,203.90 340.18,221.41 343.25,216.20 346.32,220.16 349.39,233.50 352.46,234.75 355.53,239.13 358.60,256.43 361.67,228.71 364.74,236.63 367.81,239.34 370.88,258.31 373.95,261.23 377.02,249.14 380.09,270.40 383.16,262.69 386.23,280.61 389.30,267.69 392.36,285.62 395.43,267.90 398.50,272.69 401.57,286.66 404.64,300.00 407.71,278.11 410.78,305.42 413.85,300.83 416.92,308.13 419.99,303.33 423.06,323.97 426.13,331.68 429.20,330.22 432.27,340.44 435.34,349.82 438.41,338.14 441.48,346.90 444.55,339.40 447.62,355.45 450.69,356.07 453.76,343.56 456.83,360.24 459.90,343.98 462.97,369.62 466.04,355.24 469.11,371.70 472.17,376.71 475.24,369.83 478.31,370.04 481.38,370.45 484.45,380.25 487.52,385.05 490.59,392.76 493.66,390.88 496.73,386.09 499.80,402.14 502.87,394.43 505.94,400.05 509.01,411.10 512.08,401.30 515.15,411.10 518.22,398.59 521.29,418.19 524.36,423.40 527.43,421.73 530.50,421.11 533.57,416.73 536.64,426.53 539.71,434.86 542.78,426.73 545.85,429.24 548.92,445.91 551.98,438.82 555.05,447.16 558.12,440.70 561.19,452.37 564.26,452.79 567.33,445.70 570.40,449.46 573.47,456.75 576.54,451.33 579.61,466.55 582.68,466.34 585.75,456.33 588.82,474.05 591.89,468.63 594.96,457.17 598.03,464.67 601.10,459.67 604.17,472.80 607.24,472.80 610.31,477.60 613.38,476.76 616.45,484.06 619.52,480.10 622.59,480.10 625.66,491.98 628.72,488.02 631.79,485.52 634.86,486.35 637.93,484.47 641.00,488.44 644.07,495.73 647.14,499.90 650.21,491.35 653.28,495.73 656.35,491.56 659.42,492.40 662.49,504.28 665.56,503.03 668.63,495.31 671.70,510.32 674.77,510.32 677.84,514.49 680.91,513.87 683.98,510.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,122.82 76.19,123.03 79.26,134.28 82.33,117.40 85.40,101.56 88.47,128.45 91.54,118.23 94.61,131.16 97.68,115.94 100.75,104.27 103.82,119.07 106.89,98.01 109.96,118.23 113.03,92.59 116.10,118.65 119.17,118.44 122.24,93.43 125.31,110.31 128.38,107.18 131.45,111.14 134.52,109.48 137.59,120.73 140.66,99.05 143.73,108.43 146.80,110.31 149.87,102.81 152.94,79.67 156.00,82.59 159.07,89.26 162.14,90.09 165.21,90.51 168.28,88.42 171.35,88.22 174.42,104.06 177.49,86.76 180.56,84.67 183.63,90.09 186.70,84.88 189.77,87.59 192.84,98.43 195.91,61.95 198.98,80.09 202.05,82.38 205.12,103.64 208.19,89.67 211.26,64.45 214.33,93.43 217.40,81.96 220.47,80.09 223.54,86.76 226.61,84.67 229.68,84.25 232.75,99.68 235.81,100.10 238.88,105.10 241.95,101.14 245.02,110.10 248.09,119.69 251.16,111.14 254.23,86.55 257.30,116.56 260.37,118.23 263.44,124.28 266.51,93.22 269.58,135.74 272.65,127.61 275.72,136.58 278.79,134.07 281.86,134.28 284.93,139.49 288.00,146.58 291.07,150.12 294.14,151.17 297.21,167.84 300.28,168.05 303.35,169.30 306.42,177.22 309.49,174.93 312.56,172.85 315.62,174.30 318.69,185.77 321.76,183.68 324.83,201.19 327.90,204.95 330.97,213.28 334.04,198.07 337.11,206.61 340.18,217.45 343.25,220.16 346.32,221.21 349.39,221.41 352.46,230.79 355.53,241.22 358.60,236.42 361.67,246.22 364.74,261.23 367.81,256.22 370.88,263.10 373.95,252.26 377.02,262.06 380.09,276.24 383.16,259.77 386.23,281.24 389.30,255.39 392.36,292.49 395.43,291.04 398.50,293.33 401.57,297.08 404.64,301.04 407.71,314.17 410.78,312.92 413.85,316.67 416.92,321.89 419.99,329.39 423.06,322.72 426.13,325.85 429.20,334.18 432.27,325.43 435.34,336.69 438.41,340.23 441.48,353.57 444.55,355.45 447.62,342.52 450.69,366.08 453.76,354.61 456.83,365.66 459.90,371.50 462.97,360.45 466.04,369.20 469.11,378.17 472.17,374.00 475.24,374.21 478.31,371.29 481.38,357.53 484.45,387.13 487.52,391.09 490.59,387.13 493.66,397.76 496.73,391.92 499.80,384.00 502.87,394.63 505.94,406.93 509.01,399.43 512.08,408.18 515.15,406.10 518.22,411.52 521.29,410.27 524.36,414.02 527.43,420.27 530.50,406.52 533.57,416.73 536.64,415.69 539.71,408.18 542.78,427.15 545.85,422.57 548.92,426.11 551.98,441.33 555.05,442.16 558.12,431.11 561.19,439.66 564.26,445.70 567.33,448.62 570.40,445.29 573.47,439.24 576.54,451.96 579.61,454.67 582.68,450.71 585.75,453.42 588.82,465.71 591.89,460.09 594.96,467.80 598.03,464.67 601.10,472.18 604.17,478.85 607.24,476.76 610.31,485.10 613.38,477.18 616.45,473.22 619.52,479.89 622.59,483.64 625.66,486.98 628.72,486.14 631.79,487.39 634.86,494.27 637.93,490.31 641.00,497.61 644.07,493.02 647.14,498.02 650.21,507.40 653.28,493.65 656.35,497.61 659.42,504.69 662.49,500.94 665.56,500.11 668.63,512.41 671.70,510.74 674.77,501.98 677.84,504.69 680.91,504.90 683.98,504.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,120.94 76.19,118.86 79.26,118.02 82.33,124.07 85.40,107.39 88.47,118.02 91.54,127.61 94.61,108.64 97.68,109.69 100.75,117.40 103.82,106.77 106.89,103.64 109.96,101.56 113.03,117.19 116.10,110.73 119.17,110.73 122.24,108.85 125.31,90.30 128.38,100.51 131.45,84.67 134.52,91.97 137.59,107.18 140.66,70.91 143.73,85.71 146.80,107.81 149.87,107.18 152.94,97.18 156.00,101.14 159.07,83.84 162.14,101.97 165.21,85.92 168.28,78.84 171.35,103.64 174.42,91.55 177.49,100.31 180.56,100.93 183.63,86.55 186.70,77.58 189.77,86.76 192.84,86.34 195.91,79.67 198.98,77.38 202.05,75.50 205.12,52.78 208.19,79.04 211.26,90.93 214.33,75.92 217.40,83.63 220.47,78.21 223.54,74.04 226.61,82.17 229.68,85.51 232.75,93.63 235.81,90.72 238.88,105.10 241.95,91.97 245.02,95.30 248.09,101.35 251.16,106.98 254.23,115.73 257.30,130.53 260.37,116.56 263.44,108.23 266.51,136.58 269.58,125.53 272.65,130.53 275.72,127.61 278.79,141.99 281.86,148.87 284.93,140.12 288.00,155.13 291.07,149.08 294.14,169.30 297.21,162.21 300.28,161.38 303.35,162.84 306.42,162.21 309.49,167.43 312.56,168.68 315.62,171.39 318.69,169.93 321.76,188.69 324.83,182.64 327.90,196.61 330.97,213.70 334.04,210.16 337.11,208.07 340.18,209.12 343.25,213.08 346.32,206.82 349.39,226.83 352.46,226.62 355.53,229.13 358.60,249.76 361.67,249.97 364.74,249.76 367.81,248.09 370.88,266.02 373.95,255.39 377.02,271.02 380.09,257.89 383.16,283.53 386.23,281.45 389.30,273.73 392.36,293.12 395.43,281.86 398.50,278.11 401.57,296.45 404.64,311.25 407.71,297.71 410.78,302.08 413.85,300.21 416.92,313.96 419.99,319.80 423.06,323.55 426.13,335.23 429.20,333.14 432.27,335.85 435.34,324.60 438.41,346.07 441.48,348.57 444.55,344.61 447.62,364.62 450.69,361.49 453.76,353.57 456.83,379.21 459.90,364.83 462.97,373.16 466.04,369.20 469.11,370.25 472.17,373.79 475.24,374.21 478.31,370.45 481.38,376.92 484.45,392.55 487.52,388.80 490.59,396.72 493.66,382.13 496.73,392.76 499.80,401.10 502.87,406.52 505.94,401.72 509.01,402.55 512.08,404.64 515.15,405.26 518.22,402.55 521.29,406.52 524.36,404.22 527.43,410.27 530.50,418.81 533.57,417.77 536.64,420.27 539.71,429.44 542.78,429.03 545.85,431.95 548.92,425.90 551.98,425.07 555.05,428.82 558.12,433.41 561.19,438.62 564.26,435.91 567.33,436.53 570.40,438.62 573.47,451.75 576.54,452.17 579.61,461.55 582.68,460.71 585.75,454.46 588.82,462.38 591.89,464.26 594.96,460.50 598.03,475.72 601.10,466.97 604.17,474.05 607.24,483.64 610.31,472.38 613.38,478.43 616.45,472.80 619.52,481.35 622.59,472.59 625.66,484.47 628.72,489.89 631.79,480.10 634.86,486.98 637.93,488.44 641.00,492.81 644.07,493.86 647.14,489.89 650.21,490.94 653.28,492.19 656.35,508.03 659.42,494.06 662.49,495.73 665.56,505.74 668.63,499.90 671.70,504.07 674.77,503.24 677.84,509.28 680.91,505.95 683.98,496.98 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,115.31 76.19,119.69 79.26,119.90 82.33,125.74 85.40,123.86 88.47,118.44 91.54,106.77 94.61,110.94 97.68,128.65 100.75,129.49 103.82,93.63 106.89,103.85 109.96,103.85 113.03,92.18 116.10,126.57 119.17,111.77 122.24,95.93 125.31,106.56 128.38,100.51 131.45,105.31 134.52,84.88 137.59,111.56 140.66,85.09 143.73,83.00 146.80,100.93 149.87,84.25 152.94,79.67 156.00,98.22 159.07,91.34 162.14,84.88 165.21,97.39 168.28,80.71 171.35,86.55 174.42,77.17 177.49,70.29 180.56,71.12 183.63,81.34 186.70,78.42 189.77,80.92 192.84,100.93 195.91,78.63 198.98,80.50 202.05,91.76 205.12,80.29 208.19,83.84 211.26,71.75 214.33,75.71 217.40,93.22 220.47,69.45 223.54,102.81 226.61,101.35 229.68,90.51 232.75,83.84 235.81,111.77 238.88,110.94 241.95,110.73 245.02,109.89 248.09,118.86 251.16,95.09 254.23,131.78 257.30,109.69 260.37,112.40 263.44,132.61 266.51,117.81 269.58,136.37 272.65,116.36 275.72,139.08 278.79,140.54 281.86,133.03 284.93,144.91 288.00,158.88 291.07,144.50 294.14,166.17 297.21,156.38 300.28,156.38 303.35,159.71 306.42,169.51 309.49,183.68 312.56,170.14 315.62,184.52 318.69,182.02 321.76,192.23 324.83,183.68 327.90,193.69 330.97,194.94 334.04,196.61 337.11,229.75 340.18,210.57 343.25,223.91 346.32,210.16 349.39,219.12 352.46,245.80 355.53,236.00 358.60,235.17 361.67,241.84 364.74,249.14 367.81,251.43 370.88,245.80 373.95,246.84 377.02,252.06 380.09,265.19 383.16,258.73 386.23,263.94 389.30,273.11 392.36,275.40 395.43,285.82 398.50,292.29 401.57,287.91 404.64,291.87 407.71,305.42 410.78,307.09 413.85,310.21 416.92,315.84 419.99,323.97 423.06,310.42 426.13,326.05 429.20,342.94 432.27,342.94 435.34,339.40 438.41,341.69 441.48,339.19 444.55,345.44 447.62,353.57 450.69,347.73 453.76,360.24 456.83,367.54 459.90,364.62 462.97,367.74 466.04,364.83 469.11,373.79 472.17,375.04 475.24,381.08 478.31,388.38 481.38,381.08 484.45,389.84 487.52,384.21 490.59,390.67 493.66,397.34 496.73,404.22 499.80,397.34 502.87,392.55 505.94,389.01 509.01,409.43 512.08,415.06 515.15,412.56 518.22,414.85 521.29,410.48 524.36,419.02 527.43,420.69 530.50,420.27 533.57,416.52 536.64,418.81 539.71,429.24 542.78,415.90 545.85,446.12 548.92,440.28 551.98,433.82 555.05,439.87 558.12,433.82 561.19,448.62 564.26,454.25 567.33,441.74 570.40,456.33 573.47,436.74 576.54,449.66 579.61,446.75 582.68,445.70 585.75,452.58 588.82,463.84 591.89,470.09 594.96,461.55 598.03,468.63 601.10,477.18 604.17,465.92 607.24,476.35 610.31,471.76 613.38,477.18 616.45,477.60 619.52,478.01 622.59,480.72 625.66,473.43 628.72,484.06 631.79,482.39 634.86,483.64 637.93,489.69 641.00,493.23 644.07,487.18 647.14,492.40 650.21,500.73 653.28,498.65 656.35,494.27 659.42,505.95 662.49,502.40 665.56,495.11 668.63,496.36 671.70,502.61 674.77,498.23 677.84,506.15 680.91,507.61 683.98,506.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,123.23 76.19,116.98 79.26,112.40 82.33,135.32 85.40,121.78 88.47,111.56 91.54,110.94 94.61,125.11 97.68,98.85 100.75,110.52 103.82,113.02 106.89,103.22 109.96,109.27 113.03,93.43 116.10,102.18 119.17,113.44 122.24,113.44 125.31,105.31 128.38,108.02 131.45,98.64 134.52,106.35 137.59,107.39 140.66,101.76 143.73,86.34 146.80,93.43 149.87,89.88 152.94,105.72 156.00,92.18 159.07,70.08 162.14,90.93 165.21,91.13 168.28,95.09 171.35,89.88 174.42,93.01 177.49,83.42 180.56,89.88 183.63,91.13 186.70,93.01 189.77,70.91 192.84,72.37 195.91,79.46 198.98,99.47 202.05,87.38 205.12,103.02 208.19,85.71 211.26,88.42 214.33,90.30 217.40,82.59 220.47,91.13 223.54,99.47 226.61,81.75 229.68,100.31 232.75,107.60 235.81,85.92 238.88,105.52 241.95,116.15 245.02,100.93 248.09,101.56 251.16,109.06 254.23,123.65 257.30,108.64 260.37,129.70 263.44,119.69 266.51,119.27 269.58,113.23 272.65,114.90 275.72,134.07 278.79,152.63 281.86,121.57 284.93,135.53 288.00,146.79 291.07,147.62 294.14,137.62 297.21,159.71 300.28,152.63 303.35,163.88 306.42,174.72 309.49,158.67 312.56,167.43 315.62,191.81 318.69,184.94 321.76,178.68 324.83,177.85 327.90,198.07 330.97,199.53 334.04,201.19 337.11,204.11 340.18,219.33 343.25,226.00 346.32,215.99 349.39,230.17 352.46,236.21 355.53,237.88 358.60,227.04 361.67,235.59 364.74,238.09 367.81,252.68 370.88,233.71 373.95,252.89 377.02,256.22 380.09,263.10 383.16,279.36 386.23,272.90 389.30,291.66 392.36,279.15 395.43,288.53 398.50,290.62 401.57,294.16 404.64,295.62 407.71,310.63 410.78,304.38 413.85,303.54 416.92,326.47 419.99,330.85 423.06,323.97 426.13,333.77 429.20,329.81 432.27,337.94 435.34,346.90 438.41,333.77 441.48,339.40 444.55,355.86 447.62,354.40 450.69,358.99 453.76,355.24 456.83,365.03 459.90,373.58 462.97,361.91 466.04,370.25 469.11,381.50 472.17,389.63 475.24,371.08 478.31,393.38 481.38,376.08 484.45,376.50 487.52,391.09 490.59,388.38 493.66,388.80 496.73,399.01 499.80,399.43 502.87,402.35 505.94,425.90 509.01,414.85 512.08,420.48 515.15,400.68 518.22,411.52 521.29,420.48 524.36,418.40 527.43,421.73 530.50,413.19 533.57,430.70 536.64,420.69 539.71,429.03 542.78,433.20 545.85,428.61 548.92,424.86 551.98,427.15 555.05,451.12 558.12,444.66 561.19,437.57 564.26,448.00 567.33,444.66 570.40,441.74 573.47,454.67 576.54,457.38 579.61,453.21 582.68,464.88 585.75,465.51 588.82,452.58 591.89,468.84 594.96,479.68 598.03,479.47 601.10,468.22 604.17,483.64 607.24,463.63 610.31,480.93 613.38,493.02 616.45,479.68 619.52,485.73 622.59,484.89 625.66,483.22 628.72,482.81 631.79,483.43 634.86,498.86 637.93,491.56 641.00,497.61 644.07,488.44 647.14,496.36 650.21,502.40 653.28,495.52 656.35,501.15 659.42,509.91 662.49,489.69 665.56,499.90 668.63,507.40 671.70,506.99 674.77,507.61 677.84,515.53 680.91,506.78 683.98,506.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,122.40 76.19,138.24 79.26,129.49 82.33,124.28 85.40,107.39 88.47,122.40 91.54,133.45 94.61,133.45 97.68,130.11 100.75,111.35 103.82,110.94 106.89,123.86 109.96,82.17 113.03,121.57 116.10,107.39 119.17,106.56 122.24,104.68 125.31,122.61 128.38,103.64 131.45,100.51 134.52,107.81 137.59,87.59 140.66,98.22 143.73,105.52 146.80,95.93 149.87,101.97 152.94,86.34 156.00,90.93 159.07,94.47 162.14,100.93 165.21,89.26 168.28,84.25 171.35,95.51 174.42,90.93 177.49,104.47 180.56,99.26 183.63,88.22 186.70,89.05 189.77,90.30 192.84,85.09 195.91,100.72 198.98,84.46 202.05,86.13 205.12,99.89 208.19,70.29 211.26,89.47 214.33,85.71 217.40,93.01 220.47,76.13 223.54,94.05 226.61,108.64 229.68,93.84 232.75,101.35 235.81,95.72 238.88,89.47 241.95,96.34 245.02,105.72 248.09,110.94 251.16,109.48 254.23,121.78 257.30,127.40 260.37,122.82 263.44,119.90 266.51,122.40 269.58,142.41 272.65,126.15 275.72,129.70 278.79,134.70 281.86,121.57 284.93,135.95 288.00,141.16 291.07,135.32 294.14,159.50 297.21,158.25 300.28,161.38 303.35,172.01 306.42,173.89 309.49,175.35 312.56,179.93 315.62,170.97 318.69,189.52 321.76,180.77 324.83,203.28 327.90,194.32 330.97,208.49 334.04,189.94 337.11,210.57 340.18,191.19 343.25,218.70 346.32,215.37 349.39,218.08 352.46,210.57 355.53,222.87 358.60,235.80 361.67,239.97 364.74,242.26 367.81,240.80 370.88,240.59 373.95,255.81 377.02,257.48 380.09,265.81 383.16,272.07 386.23,266.44 389.30,289.16 392.36,273.53 395.43,285.62 398.50,293.75 401.57,306.88 404.64,296.25 407.71,303.54 410.78,302.71 413.85,308.96 416.92,303.33 419.99,321.26 423.06,315.22 426.13,324.80 429.20,334.39 432.27,338.98 435.34,341.48 438.41,351.28 441.48,341.06 444.55,347.94 447.62,359.41 450.69,358.36 453.76,361.49 456.83,366.70 459.90,359.82 462.97,359.61 466.04,371.91 469.11,377.33 472.17,367.33 475.24,365.24 478.31,381.92 481.38,381.08 484.45,380.04 487.52,389.01 490.59,396.51 493.66,393.59 496.73,393.17 499.80,392.97 502.87,393.17 505.94,404.43 509.01,400.68 512.08,402.76 515.15,413.60 518.22,394.22 521.29,404.22 524.36,411.31 527.43,427.78 530.50,420.27 533.57,415.69 536.64,415.27 539.71,426.11 542.78,424.44 545.85,441.33 548.92,444.04 551.98,430.70 555.05,443.41 558.12,437.57 561.19,440.28 564.26,446.12 567.33,449.25 570.40,452.79 573.47,446.12 576.54,458.42 579.61,451.54 582.68,460.29 585.75,450.08 588.82,459.67 591.89,462.80 594.96,464.46 598.03,467.80 601.10,466.55 604.17,477.18 607.24,463.00 610.31,481.56 613.38,484.27 616.45,488.02 619.52,485.31 622.59,486.77 625.66,481.77 628.72,479.26 631.79,492.60 634.86,487.39 637.93,489.27 641.00,488.44 644.07,502.82 647.14,493.02 650.21,495.73 653.28,507.82 656.35,504.28 659.42,509.28 662.49,503.86 665.56,506.99 668.63,496.56 671.70,507.40 674.77,513.45 677.84,515.95 680.91,504.49 683.98,519.08 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,105.52 76.19,111.77 79.26,114.90 82.33,105.52 85.40,112.19 88.47,116.56 91.54,92.38 94.61,107.60 97.68,113.44 100.75,119.90 103.82,105.31 106.89,123.44 109.96,104.27 113.03,94.68 116.10,108.85 119.17,105.10 122.24,102.60 125.31,114.90 128.38,119.90 131.45,90.51 134.52,95.93 137.59,100.72 140.66,100.31 143.73,111.14 146.80,87.59 149.87,102.18 152.94,86.55 156.00,90.30 159.07,96.14 162.14,77.17 165.21,78.42 168.28,110.31 171.35,84.67 174.42,101.76 177.49,95.30 180.56,85.92 183.63,99.26 186.70,66.12 189.77,57.36 192.84,84.25 195.91,76.13 198.98,93.63 202.05,76.33 205.12,62.99 208.19,81.96 211.26,71.12 214.33,77.79 217.40,86.34 220.47,83.42 223.54,76.54 226.61,87.80 229.68,103.22 232.75,117.81 235.81,93.84 238.88,94.26 241.95,90.93 245.02,115.31 248.09,100.10 251.16,117.40 254.23,114.90 257.30,117.61 260.37,104.89 263.44,128.24 266.51,135.32 269.58,133.87 272.65,141.58 275.72,115.11 278.79,120.32 281.86,135.12 284.93,128.86 288.00,165.55 291.07,154.29 294.14,153.25 297.21,163.05 300.28,149.08 303.35,165.34 306.42,172.01 309.49,174.10 312.56,173.89 315.62,196.61 318.69,186.39 321.76,192.44 324.83,182.23 327.90,212.87 330.97,215.37 334.04,216.62 337.11,221.41 340.18,236.21 343.25,226.00 346.32,224.96 349.39,254.56 352.46,232.25 355.53,244.34 358.60,261.23 361.67,254.56 364.74,237.26 367.81,249.14 370.88,251.43 373.95,260.60 377.02,252.06 380.09,257.27 383.16,264.35 386.23,271.23 389.30,280.40 392.36,281.66 395.43,299.37 398.50,287.91 401.57,301.46 404.64,312.92 407.71,299.16 410.78,316.26 413.85,315.42 416.92,308.54 419.99,321.26 423.06,325.85 426.13,324.39 429.20,325.01 432.27,330.22 435.34,346.48 438.41,336.27 441.48,332.52 444.55,343.77 447.62,355.24 450.69,352.74 453.76,354.61 456.83,369.83 459.90,361.07 462.97,360.03 466.04,372.75 469.11,375.46 472.17,379.21 475.24,374.83 478.31,384.00 481.38,376.08 484.45,393.80 487.52,381.50 490.59,397.34 493.66,388.17 496.73,385.67 499.80,389.63 502.87,393.59 505.94,410.06 509.01,396.09 512.08,401.30 515.15,407.14 518.22,408.18 521.29,416.73 524.36,419.86 527.43,421.52 530.50,417.15 533.57,416.94 536.64,431.11 539.71,420.69 542.78,424.65 545.85,430.70 548.92,428.40 551.98,440.91 555.05,445.08 558.12,440.49 561.19,441.33 564.26,438.41 567.33,442.37 570.40,442.16 573.47,449.66 576.54,456.96 579.61,456.33 582.68,463.84 585.75,451.54 588.82,463.84 591.89,468.63 594.96,472.38 598.03,470.30 601.10,463.00 604.17,463.63 607.24,470.30 610.31,476.35 613.38,476.76 616.45,474.47 619.52,478.22 622.59,472.18 625.66,480.93 628.72,486.98 631.79,490.73 634.86,485.93 637.93,496.36 641.00,491.98 644.07,498.02 647.14,498.86 650.21,483.43 653.28,497.19 656.35,500.73 659.42,505.95 662.49,511.78 665.56,506.78 668.63,500.32 671.70,503.86 674.77,503.44 677.84,501.78 680.91,511.78 683.98,518.66 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,124.49 76.19,112.19 79.26,134.49 82.33,117.81 85.40,110.52 88.47,120.73 91.54,134.70 94.61,131.99 97.68,120.52 100.75,127.40 103.82,101.14 106.89,117.61 109.96,117.81 113.03,110.94 116.10,105.31 119.17,107.18 122.24,89.47 125.31,113.02 128.38,114.27 131.45,105.52 134.52,102.39 137.59,97.60 140.66,104.47 143.73,96.55 146.80,94.68 149.87,96.34 152.94,95.93 156.00,83.00 159.07,96.14 162.14,108.64 165.21,95.93 168.28,82.59 171.35,98.22 174.42,101.97 177.49,88.01 180.56,89.88 183.63,99.26 186.70,102.81 189.77,86.96 192.84,81.96 195.91,92.80 198.98,85.71 202.05,68.62 205.12,81.75 208.19,81.54 211.26,79.46 214.33,86.96 217.40,91.13 220.47,80.92 223.54,67.16 226.61,90.93 229.68,98.01 232.75,98.01 235.81,94.26 238.88,88.63 241.95,116.15 245.02,116.36 248.09,109.69 251.16,108.64 254.23,114.27 257.30,118.44 260.37,104.47 263.44,127.61 266.51,104.89 269.58,121.57 272.65,119.07 275.72,141.79 278.79,138.03 281.86,142.41 284.93,137.83 288.00,138.45 291.07,171.18 294.14,150.75 297.21,152.83 300.28,143.04 303.35,169.09 306.42,177.43 309.49,163.67 312.56,176.39 315.62,195.36 318.69,174.93 321.76,184.73 324.83,185.98 327.90,188.06 330.97,215.79 334.04,204.32 337.11,206.61 340.18,217.66 343.25,222.66 346.32,211.41 349.39,222.46 352.46,224.75 355.53,248.09 358.60,241.01 361.67,252.89 364.74,248.93 367.81,254.97 370.88,241.84 373.95,267.90 377.02,258.10 380.09,252.89 383.16,266.44 386.23,271.23 389.30,279.78 392.36,275.40 395.43,289.16 398.50,296.66 401.57,288.33 404.64,309.38 407.71,303.96 410.78,306.04 413.85,307.71 416.92,319.18 419.99,319.18 423.06,319.59 426.13,328.56 429.20,328.97 432.27,336.06 435.34,337.10 438.41,343.77 441.48,347.73 444.55,349.61 447.62,348.78 450.69,348.78 453.76,355.03 456.83,360.24 459.90,365.66 462.97,370.04 466.04,367.33 469.11,381.29 472.17,379.63 475.24,375.04 478.31,392.34 481.38,385.46 484.45,370.87 487.52,373.58 490.59,384.21 493.66,387.34 496.73,384.21 499.80,391.09 502.87,401.10 505.94,396.09 509.01,390.46 512.08,396.09 515.15,396.93 518.22,406.10 521.29,397.76 524.36,413.39 527.43,411.73 530.50,410.48 533.57,424.44 536.64,426.53 539.71,429.03 542.78,420.48 545.85,429.03 548.92,433.20 551.98,442.79 555.05,439.87 558.12,444.87 561.19,445.50 564.26,456.33 567.33,443.83 570.40,441.33 573.47,451.96 576.54,455.50 579.61,454.04 582.68,465.09 585.75,455.08 588.82,462.38 591.89,457.59 594.96,470.09 598.03,467.59 601.10,464.46 604.17,474.26 607.24,485.10 610.31,478.64 613.38,479.89 616.45,481.35 619.52,471.76 622.59,482.39 625.66,480.93 628.72,483.02 631.79,491.56 634.86,478.64 637.93,490.94 641.00,482.81 644.07,493.86 647.14,498.23 650.21,494.06 653.28,490.73 656.35,498.44 659.42,493.44 662.49,500.53 665.56,503.24 668.63,500.73 671.70,512.20 674.77,504.49 677.84,509.70 680.91,514.70 683.98,504.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,129.07 76.19,119.69 79.26,110.73 82.33,113.85 85.40,114.69 88.47,112.19 91.54,122.82 94.61,114.90 97.68,102.60 100.75,121.15 103.82,117.19 106.89,105.31 109.96,113.02 113.03,119.90 116.10,113.85 119.17,100.93 122.24,95.93 125.31,111.35 128.38,106.77 131.45,104.68 134.52,99.47 137.59,111.77 140.66,82.59 143.73,88.01 146.80,93.63 149.87,106.56 152.94,105.10 156.00,71.12 159.07,89.88 162.14,86.13 165.21,84.05 168.28,101.56 171.35,68.41 174.42,75.08 177.49,79.25 180.56,79.46 183.63,84.67 186.70,89.47 189.77,105.72 192.84,94.47 195.91,108.43 198.98,83.00 202.05,120.52 205.12,76.54 208.19,98.64 211.26,96.14 214.33,85.71 217.40,112.81 220.47,109.27 223.54,96.97 226.61,93.63 229.68,102.39 232.75,86.13 235.81,103.64 238.88,120.73 241.95,103.43 245.02,94.89 248.09,118.86 251.16,101.56 254.23,123.03 257.30,110.52 260.37,136.78 263.44,121.57 266.51,144.70 269.58,122.82 272.65,137.20 275.72,117.19 278.79,141.37 281.86,148.04 284.93,136.99 288.00,145.12 291.07,146.79 294.14,147.00 297.21,150.12 300.28,157.42 303.35,158.88 306.42,167.43 309.49,176.81 312.56,183.48 315.62,200.99 318.69,194.52 321.76,185.14 324.83,192.44 327.90,203.90 330.97,200.36 334.04,228.29 337.11,224.12 340.18,213.28 343.25,222.04 346.32,226.83 349.39,232.46 352.46,221.00 355.53,228.29 358.60,244.55 361.67,252.47 364.74,254.14 367.81,248.93 370.88,253.93 373.95,258.73 377.02,269.77 380.09,269.36 383.16,286.03 386.23,274.78 389.30,278.53 392.36,283.95 395.43,282.91 398.50,281.45 401.57,295.62 404.64,292.29 407.71,297.91 410.78,308.13 413.85,318.34 416.92,314.80 419.99,315.63 423.06,327.72 426.13,316.67 429.20,327.72 432.27,332.31 435.34,335.85 438.41,327.93 441.48,343.77 444.55,335.64 447.62,362.53 450.69,347.11 453.76,353.15 456.83,366.70 459.90,359.41 462.97,353.99 466.04,361.49 469.11,363.37 472.17,374.41 475.24,381.08 478.31,376.08 481.38,377.33 484.45,391.09 487.52,386.30 490.59,376.92 493.66,379.83 496.73,384.84 499.80,397.14 502.87,395.88 505.94,406.93 509.01,400.89 512.08,411.52 515.15,409.64 518.22,410.89 521.29,411.73 524.36,422.15 527.43,423.40 530.50,424.86 533.57,420.48 536.64,418.81 539.71,426.94 542.78,424.86 545.85,433.41 548.92,442.58 551.98,441.12 555.05,447.58 558.12,444.04 561.19,445.29 564.26,444.24 567.33,437.37 570.40,441.33 573.47,451.96 576.54,448.00 579.61,460.50 582.68,464.26 585.75,457.79 588.82,463.21 591.89,463.63 594.96,468.63 598.03,466.13 601.10,475.09 604.17,468.22 607.24,478.64 610.31,480.10 613.38,480.10 616.45,476.35 619.52,488.64 622.59,488.02 625.66,485.73 628.72,483.85 631.79,491.15 634.86,496.56 637.93,486.77 641.00,488.44 644.07,494.69 647.14,492.60 650.21,492.19 653.28,489.27 656.35,493.44 659.42,499.27 662.49,501.15 665.56,502.40 668.63,503.24 671.70,511.78 674.77,513.24 677.84,505.95 680.91,516.16 683.98,511.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,129.49 76.19,125.53 79.26,115.52 82.33,104.27 85.40,138.03 88.47,134.07 91.54,122.19 94.61,120.32 97.68,135.12 100.75,119.27 103.82,112.40 106.89,136.58 109.96,104.47 113.03,124.69 116.10,126.57 119.17,114.27 122.24,87.80 125.31,120.73 128.38,131.16 131.45,114.69 134.52,110.10 137.59,103.85 140.66,106.14 143.73,94.26 146.80,93.84 149.87,82.80 152.94,102.39 156.00,91.55 159.07,76.33 162.14,84.46 165.21,87.38 168.28,99.47 171.35,98.85 174.42,78.21 177.49,82.59 180.56,95.09 183.63,62.16 186.70,84.67 189.77,65.49 192.84,79.88 195.91,89.47 198.98,76.13 202.05,77.58 205.12,81.54 208.19,84.25 211.26,63.62 214.33,98.01 217.40,94.68 220.47,73.62 223.54,85.09 226.61,100.10 229.68,73.83 232.75,113.44 235.81,94.47 238.88,105.93 241.95,92.38 245.02,94.68 248.09,99.68 251.16,104.47 254.23,116.77 257.30,103.43 260.37,110.94 263.44,115.52 266.51,115.94 269.58,100.93 272.65,139.49 275.72,107.81 278.79,139.08 281.86,144.91 284.93,120.32 288.00,149.50 291.07,134.49 294.14,148.67 297.21,170.34 300.28,163.05 303.35,169.93 306.42,150.12 309.49,179.52 312.56,182.02 315.62,172.64 318.69,186.81 321.76,212.03 324.83,197.86 327.90,199.11 330.97,210.16 334.04,193.69 337.11,196.82 340.18,208.07 343.25,233.50 346.32,225.58 349.39,225.79 352.46,237.88 355.53,241.01 358.60,244.34 361.67,257.27 364.74,230.79 367.81,276.03 370.88,248.93 373.95,250.80 377.02,261.44 380.09,261.85 383.16,250.60 386.23,283.74 389.30,284.16 392.36,274.57 395.43,286.03 398.50,282.49 401.57,297.29 404.64,299.58 407.71,294.37 410.78,310.42 413.85,312.71 416.92,301.87 419.99,320.01 423.06,317.30 426.13,329.39 429.20,328.14 432.27,331.06 435.34,351.28 438.41,353.78 441.48,345.86 444.55,356.49 447.62,353.57 450.69,354.82 453.76,352.94 456.83,362.74 459.90,366.49 462.97,364.62 466.04,366.49 469.11,374.41 472.17,385.05 475.24,371.70 478.31,375.46 481.38,379.42 484.45,382.34 487.52,388.38 490.59,386.09 493.66,379.83 496.73,392.76 499.80,402.14 502.87,397.76 505.94,401.93 509.01,406.10 512.08,405.06 515.15,415.06 518.22,412.98 521.29,412.98 524.36,428.61 527.43,417.15 530.50,427.15 533.57,419.86 536.64,417.98 539.71,422.36 542.78,427.36 545.85,433.82 548.92,429.65 551.98,434.86 555.05,444.04 558.12,432.15 561.19,443.20 564.26,446.95 567.33,447.37 570.40,448.00 573.47,448.41 576.54,454.88 579.61,458.42 582.68,453.21 585.75,461.75 588.82,458.63 591.89,466.34 594.96,467.80 598.03,468.84 601.10,472.80 604.17,471.55 607.24,478.22 610.31,478.01 613.38,469.68 616.45,491.77 619.52,482.81 622.59,483.43 625.66,481.97 628.72,486.14 631.79,487.39 634.86,491.15 637.93,485.10 641.00,496.56 644.07,487.18 647.14,491.35 650.21,491.98 653.28,496.98 656.35,491.77 659.42,501.36 662.49,500.11 665.56,503.24 668.63,498.44 671.70,507.40 674.77,506.15 677.84,503.24 680.91,513.87 683.98,505.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,130.95 76.19,141.37 79.26,116.15 82.33,133.87 85.40,111.35 88.47,106.98 91.54,111.35 94.61,91.76 97.68,89.67 100.75,111.35 103.82,107.60 106.89,110.10 109.96,115.94 113.03,99.89 116.10,99.68 119.17,103.43 122.24,104.68 125.31,98.85 128.38,120.11 131.45,107.39 134.52,107.60 137.59,101.35 140.66,110.52 143.73,104.27 146.80,109.89 149.87,100.31 152.94,108.85 156.00,72.79 159.07,89.26 162.14,79.88 165.21,85.71 168.28,73.21 171.35,60.70 174.42,66.12 177.49,89.67 180.56,79.88 183.63,69.04 186.70,100.72 189.77,85.92 192.84,75.29 195.91,78.21 198.98,78.00 202.05,76.96 205.12,76.13 208.19,85.51 211.26,86.34 214.33,85.09 217.40,100.93 220.47,82.80 223.54,83.42 226.61,94.47 229.68,84.67 232.75,96.55 235.81,91.34 238.88,105.93 241.95,116.56 245.02,120.73 248.09,94.26 251.16,111.98 254.23,117.19 257.30,108.43 260.37,114.90 263.44,97.60 266.51,128.24 269.58,140.33 272.65,117.19 275.72,119.27 278.79,119.90 281.86,126.78 284.93,140.33 288.00,149.50 291.07,159.30 294.14,138.66 297.21,159.50 300.28,163.88 303.35,174.30 306.42,178.89 309.49,167.22 312.56,169.72 315.62,170.97 318.69,185.14 321.76,184.52 324.83,185.56 327.90,181.18 330.97,196.19 334.04,218.50 337.11,213.70 340.18,216.62 343.25,211.20 346.32,227.25 349.39,229.96 352.46,239.13 355.53,233.30 358.60,240.59 361.67,250.39 364.74,243.93 367.81,251.22 370.88,235.17 373.95,267.90 377.02,262.89 380.09,262.69 383.16,271.44 386.23,281.24 389.30,284.78 392.36,286.66 395.43,286.87 398.50,296.66 401.57,296.04 404.64,310.00 407.71,309.17 410.78,310.84 413.85,315.01 416.92,314.80 419.99,318.55 423.06,318.97 426.13,323.55 429.20,338.77 432.27,334.18 435.34,322.09 438.41,343.77 441.48,341.48 444.55,348.98 447.62,351.69 450.69,353.78 453.76,365.87 456.83,365.24 459.90,372.75 462.97,361.49 466.04,373.37 469.11,376.92 472.17,377.54 475.24,370.66 478.31,385.25 481.38,375.25 484.45,385.88 487.52,383.38 490.59,390.67 493.66,392.55 496.73,406.10 499.80,397.97 502.87,373.37 505.94,411.94 509.01,395.68 512.08,410.48 515.15,405.26 518.22,399.01 521.29,425.28 524.36,419.23 527.43,426.73 530.50,423.61 533.57,424.23 536.64,435.91 539.71,424.65 542.78,424.65 545.85,438.20 548.92,445.29 551.98,440.08 555.05,445.08 558.12,444.45 561.19,444.24 564.26,445.50 567.33,451.33 570.40,452.37 573.47,459.25 576.54,457.79 579.61,461.34 582.68,457.17 585.75,459.88 588.82,461.13 591.89,465.92 594.96,464.26 598.03,466.13 601.10,462.59 604.17,473.84 607.24,464.88 610.31,482.60 613.38,475.30 616.45,483.02 619.52,476.35 622.59,471.76 625.66,479.26 628.72,481.35 631.79,477.80 634.86,488.02 637.93,487.18 641.00,494.48 644.07,493.65 647.14,486.35 650.21,486.77 653.28,486.56 656.35,499.48 659.42,499.90 662.49,492.81 665.56,505.11 668.63,498.23 671.70,508.86 674.77,503.24 677.84,507.82 680.91,507.20 683.98,508.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,123.44 76.19,130.11 79.26,117.40 82.33,107.18 85.40,115.52 88.47,129.28 91.54,128.24 94.61,130.74 97.68,133.87 100.75,101.97 103.82,113.44 106.89,106.98 109.96,105.10 113.03,103.02 116.10,117.61 119.17,81.54 122.24,106.98 125.31,124.49 128.38,101.76 131.45,96.97 134.52,116.15 137.59,110.52 140.66,94.68 143.73,99.26 146.80,81.54 149.87,86.76 152.94,92.80 156.00,87.80 159.07,99.68 162.14,77.17 165.21,82.38 168.28,95.09 171.35,82.59 174.42,96.97 177.49,79.46 180.56,81.96 183.63,88.22 186.70,74.46 189.77,81.96 192.84,87.59 195.91,100.31 198.98,73.42 202.05,90.09 205.12,81.75 208.19,87.80 211.26,104.06 214.33,79.04 217.40,94.47 220.47,101.97 223.54,97.18 226.61,95.09 229.68,96.76 232.75,110.10 235.81,111.56 238.88,98.43 241.95,101.76 245.02,120.32 248.09,95.93 251.16,80.92 254.23,116.36 257.30,117.19 260.37,130.11 263.44,96.55 266.51,108.02 269.58,97.60 272.65,130.53 275.72,134.49 278.79,119.69 281.86,128.65 284.93,150.75 288.00,140.33 291.07,141.37 294.14,146.37 297.21,154.71 300.28,152.21 303.35,157.63 306.42,168.68 309.49,168.47 312.56,193.48 315.62,192.44 318.69,182.43 321.76,189.10 324.83,186.19 327.90,206.61 330.97,210.57 334.04,200.36 337.11,198.90 340.18,204.74 343.25,226.83 346.32,226.42 349.39,247.68 352.46,236.63 355.53,234.55 358.60,254.35 361.67,248.72 364.74,243.72 367.81,244.13 370.88,262.89 373.95,251.22 377.02,261.44 380.09,256.22 383.16,257.48 386.23,271.02 389.30,271.02 392.36,271.65 395.43,286.03 398.50,290.83 401.57,300.42 404.64,289.58 407.71,311.25 410.78,313.96 413.85,307.50 416.92,291.24 419.99,322.93 423.06,333.77 426.13,332.10 429.20,332.93 432.27,336.69 435.34,336.06 438.41,337.31 441.48,335.43 444.55,341.48 447.62,341.06 450.69,351.28 453.76,351.49 456.83,353.36 459.90,354.61 462.97,354.40 466.04,358.99 469.11,368.37 472.17,363.99 475.24,360.87 478.31,378.58 481.38,389.01 484.45,387.13 487.52,391.72 490.59,396.93 493.66,385.46 496.73,399.22 499.80,377.12 502.87,406.52 505.94,402.76 509.01,409.85 512.08,406.93 515.15,396.93 518.22,414.02 521.29,411.10 524.36,417.35 527.43,425.69 530.50,418.61 533.57,414.44 536.64,422.15 539.71,425.07 542.78,422.36 545.85,434.86 548.92,445.70 551.98,441.95 555.05,433.61 558.12,446.75 561.19,444.87 564.26,443.62 567.33,443.20 570.40,441.53 573.47,449.87 576.54,450.08 579.61,459.88 582.68,459.67 585.75,450.71 588.82,466.34 591.89,457.38 594.96,460.09 598.03,472.38 601.10,457.17 604.17,472.38 607.24,469.05 610.31,478.01 613.38,478.85 616.45,479.06 619.52,478.64 622.59,481.56 625.66,488.44 628.72,479.68 631.79,476.76 634.86,484.47 637.93,482.18 641.00,483.43 644.07,487.81 647.14,493.65 650.21,501.36 653.28,495.73 656.35,491.35 659.42,494.48 662.49,497.82 665.56,498.44 668.63,501.98 671.70,503.03 674.77,505.11 677.84,503.65 680.91,508.65 683.98,515.53 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,146.79 76.19,118.65 79.26,138.66 82.33,125.11 85.40,121.78 88.47,119.69 91.54,107.18 94.61,116.56 97.68,114.69 100.75,105.31 103.82,96.76 106.89,96.14 109.96,128.24 113.03,108.23 116.10,108.43 119.17,105.93 122.24,104.89 125.31,105.52 128.38,72.37 131.45,97.39 134.52,91.34 137.59,87.38 140.66,87.38 143.73,83.84 146.80,98.01 149.87,102.81 152.94,94.05 156.00,81.34 159.07,91.76 162.14,79.88 165.21,86.76 168.28,74.87 171.35,103.02 174.42,83.63 177.49,95.93 180.56,95.30 183.63,87.38 186.70,79.46 189.77,69.04 192.84,70.08 195.91,89.88 198.98,70.91 202.05,72.58 205.12,95.51 208.19,79.88 211.26,73.62 214.33,78.42 217.40,84.88 220.47,80.09 223.54,89.67 226.61,99.26 229.68,78.42 232.75,99.89 235.81,88.42 238.88,96.97 241.95,110.10 245.02,118.02 248.09,108.02 251.16,119.90 254.23,123.86 257.30,107.81 260.37,121.36 263.44,127.20 266.51,147.21 269.58,125.74 272.65,140.74 275.72,138.03 278.79,143.45 281.86,141.37 284.93,141.79 288.00,147.00 291.07,165.76 294.14,141.37 297.21,156.79 300.28,150.75 303.35,177.01 306.42,163.47 309.49,189.10 312.56,175.35 315.62,189.73 318.69,192.23 321.76,194.52 324.83,192.23 327.90,193.90 330.97,200.78 334.04,201.82 337.11,207.45 340.18,196.40 343.25,209.95 346.32,225.58 349.39,229.33 352.46,233.30 355.53,231.84 358.60,223.50 361.67,239.34 364.74,241.42 367.81,229.33 370.88,254.14 373.95,256.02 377.02,250.39 380.09,241.01 383.16,263.31 386.23,272.90 389.30,278.11 392.36,284.16 395.43,273.32 398.50,299.16 401.57,275.82 404.64,285.20 407.71,310.84 410.78,301.04 413.85,296.45 416.92,312.92 419.99,321.26 423.06,325.85 426.13,329.81 429.20,321.05 432.27,342.31 435.34,340.44 438.41,334.18 441.48,335.64 444.55,357.74 447.62,336.48 450.69,367.33 453.76,359.82 456.83,350.65 459.90,359.61 462.97,365.03 466.04,372.54 469.11,357.53 472.17,379.63 475.24,375.87 478.31,389.63 481.38,386.50 484.45,385.25 487.52,395.26 490.59,389.01 493.66,406.31 496.73,402.76 499.80,395.47 502.87,397.55 505.94,399.85 509.01,399.22 512.08,408.18 515.15,403.39 518.22,419.23 521.29,417.98 524.36,404.43 527.43,411.73 530.50,426.53 533.57,429.24 536.64,428.19 539.71,420.48 542.78,441.12 545.85,430.90 548.92,432.57 551.98,439.66 555.05,424.86 558.12,448.41 561.19,442.79 564.26,453.00 567.33,449.25 570.40,452.37 573.47,452.79 576.54,458.84 579.61,450.71 582.68,463.42 585.75,453.42 588.82,464.88 591.89,469.68 594.96,480.72 598.03,473.22 601.10,463.21 604.17,481.77 607.24,482.81 610.31,479.68 613.38,486.98 616.45,480.31 619.52,490.10 622.59,494.27 625.66,480.93 628.72,485.73 631.79,476.55 634.86,486.98 637.93,493.23 641.00,490.31 644.07,492.81 647.14,495.94 650.21,501.78 653.28,494.69 656.35,493.65 659.42,496.36 662.49,501.36 665.56,500.11 668.63,504.28 671.70,505.95 674.77,500.53 677.84,506.99 680.91,515.74 683.98,508.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,125.32 76.19,121.98 79.26,138.66 82.33,121.98 85.40,109.48 88.47,118.23 91.54,129.70 94.61,120.94 97.68,107.60 100.75,99.47 103.82,119.07 106.89,119.90 109.96,117.61 113.03,82.59 116.10,92.80 119.17,101.56 122.24,96.14 125.31,124.28 128.38,97.80 131.45,102.39 134.52,97.18 137.59,108.85 140.66,86.34 143.73,112.19 146.80,87.59 149.87,82.38 152.94,81.13 156.00,98.22 159.07,85.51 162.14,74.25 165.21,106.98 168.28,89.05 171.35,90.72 174.42,84.25 177.49,62.37 180.56,68.00 183.63,82.38 186.70,95.93 189.77,81.54 192.84,69.66 195.91,83.00 198.98,76.33 202.05,79.88 205.12,86.13 208.19,58.82 211.26,88.84 214.33,83.00 217.40,91.55 220.47,84.46 223.54,99.47 226.61,85.09 229.68,69.45 232.75,71.75 235.81,110.31 238.88,98.01 241.95,105.10 245.02,124.49 248.09,100.31 251.16,103.64 254.23,109.48 257.30,119.90 260.37,132.61 263.44,118.65 266.51,136.78 269.58,130.74 272.65,120.73 275.72,132.20 278.79,120.32 281.86,123.44 284.93,153.46 288.00,129.90 291.07,138.66 294.14,146.79 297.21,156.17 300.28,167.84 303.35,164.09 306.42,157.84 309.49,171.39 312.56,179.52 315.62,195.77 318.69,178.89 321.76,195.98 324.83,218.50 327.90,182.85 330.97,214.33 334.04,180.97 337.11,213.08 340.18,222.25 343.25,233.30 346.32,209.12 349.39,217.87 352.46,227.88 355.53,230.79 358.60,260.81 361.67,255.60 364.74,245.39 367.81,250.80 370.88,255.60 373.95,264.56 377.02,267.69 380.09,264.77 383.16,259.35 386.23,274.36 389.30,285.20 392.36,282.28 395.43,276.86 398.50,290.20 401.57,288.74 404.64,292.29 407.71,302.08 410.78,297.08 413.85,306.25 416.92,317.72 419.99,313.13 423.06,306.88 426.13,301.67 429.20,332.93 432.27,329.81 435.34,345.86 438.41,340.23 441.48,343.98 444.55,347.52 447.62,357.32 450.69,355.45 453.76,356.49 456.83,377.75 459.90,367.54 462.97,375.25 466.04,370.66 469.11,358.57 472.17,374.83 475.24,376.92 478.31,360.66 481.38,381.71 484.45,384.42 487.52,388.38 490.59,379.83 493.66,391.09 496.73,396.30 499.80,395.26 502.87,395.05 505.94,395.47 509.01,398.80 512.08,403.18 515.15,396.72 518.22,411.52 521.29,413.19 524.36,413.19 527.43,411.94 530.50,412.77 533.57,416.31 536.64,404.85 539.71,425.07 542.78,429.65 545.85,427.15 548.92,436.53 551.98,440.91 555.05,430.90 558.12,426.53 561.19,442.37 564.26,446.54 567.33,440.70 570.40,445.08 573.47,449.46 576.54,458.63 579.61,453.83 582.68,451.75 585.75,463.00 588.82,463.42 591.89,468.42 594.96,465.30 598.03,470.93 601.10,466.34 604.17,462.59 607.24,472.18 610.31,476.14 613.38,466.55 616.45,476.97 619.52,479.68 622.59,482.18 625.66,485.31 628.72,487.18 631.79,485.73 634.86,476.97 637.93,487.81 641.00,500.94 644.07,486.14 647.14,493.23 650.21,495.11 653.28,498.02 656.35,491.98 659.42,494.27 662.49,502.19 665.56,501.57 668.63,505.53 671.70,501.98 674.77,501.98 677.84,509.91 680.91,507.40 683.98,508.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,128.65 76.19,133.24 79.26,116.15 82.33,134.28 85.40,129.49 88.47,128.03 91.54,130.53 94.61,100.93 97.68,107.39 100.75,120.11 103.82,111.14 106.89,127.61 109.96,105.93 113.03,107.18 116.10,119.90 119.17,105.31 122.24,114.06 125.31,113.44 128.38,112.81 131.45,118.44 134.52,105.93 137.59,104.47 140.66,81.54 143.73,100.51 146.80,96.14 149.87,82.38 152.94,78.21 156.00,70.91 159.07,93.43 162.14,91.76 165.21,78.84 168.28,76.13 171.35,69.25 174.42,75.29 177.49,79.25 180.56,64.66 183.63,68.41 186.70,90.09 189.77,80.92 192.84,83.21 195.91,76.54 198.98,81.34 202.05,69.87 205.12,75.71 208.19,84.25 211.26,99.68 214.33,94.05 217.40,106.14 220.47,91.76 223.54,95.93 226.61,91.76 229.68,110.10 232.75,101.14 235.81,107.39 238.88,108.23 241.95,103.22 245.02,94.05 248.09,101.35 251.16,126.36 254.23,111.98 257.30,125.74 260.37,119.69 263.44,121.57 266.51,114.48 269.58,118.02 272.65,127.82 275.72,124.07 278.79,146.37 281.86,144.50 284.93,133.03 288.00,154.08 291.07,139.08 294.14,150.33 297.21,136.37 300.28,156.17 303.35,163.67 306.42,155.34 309.49,165.34 312.56,187.64 315.62,182.23 318.69,193.06 321.76,181.39 324.83,189.52 327.90,200.36 330.97,217.24 334.04,205.36 337.11,207.45 340.18,211.20 343.25,204.53 346.32,230.79 349.39,229.13 352.46,241.01 355.53,226.21 358.60,244.97 361.67,237.26 364.74,238.92 367.81,249.35 370.88,270.19 373.95,263.31 377.02,263.31 380.09,262.27 383.16,276.03 386.23,268.52 389.30,281.86 392.36,280.20 395.43,288.95 398.50,284.78 401.57,299.37 404.64,299.16 407.71,297.29 410.78,306.88 413.85,304.58 416.92,301.04 419.99,328.35 423.06,308.13 426.13,325.43 429.20,331.47 432.27,338.35 435.34,342.31 438.41,340.23 441.48,354.40 444.55,329.81 447.62,342.73 450.69,357.95 453.76,338.98 456.83,361.70 459.90,351.28 462.97,360.45 466.04,368.37 469.11,371.91 472.17,371.91 475.24,373.16 478.31,380.67 481.38,378.17 484.45,381.29 487.52,391.72 490.59,388.38 493.66,384.42 496.73,389.84 499.80,388.59 502.87,402.35 505.94,394.01 509.01,406.93 512.08,407.35 515.15,410.27 518.22,407.56 521.29,412.35 524.36,405.06 527.43,404.85 530.50,416.73 533.57,420.06 536.64,425.28 539.71,438.82 542.78,426.94 545.85,437.78 548.92,424.65 551.98,431.11 555.05,435.07 558.12,443.41 561.19,442.37 564.26,432.57 567.33,441.53 570.40,450.50 573.47,452.17 576.54,468.22 579.61,452.37 582.68,451.75 585.75,459.04 588.82,459.04 591.89,463.63 594.96,472.38 598.03,473.43 601.10,476.76 604.17,466.97 607.24,474.68 610.31,471.55 613.38,477.18 616.45,479.06 619.52,466.13 622.59,484.68 625.66,481.35 628.72,490.52 631.79,479.89 634.86,494.90 637.93,490.10 641.00,486.56 644.07,485.10 647.14,491.15 650.21,494.27 653.28,503.03 656.35,506.15 659.42,505.95 662.49,498.86 665.56,510.95 668.63,504.90 671.70,504.69 674.77,503.24 677.84,502.61 680.91,505.53 683.98,516.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,139.49 76.19,135.32 79.26,136.16 82.33,140.33 85.40,135.95 88.47,148.04 91.54,140.95 94.61,130.11 97.68,98.64 100.75,112.40 103.82,115.11 106.89,116.36 109.96,123.03 113.03,104.27 116.10,105.10 119.17,123.03 122.24,85.71 125.31,121.98 128.38,101.35 131.45,110.52 134.52,105.72 137.59,86.96 140.66,94.68 143.73,113.02 146.80,87.59 149.87,109.69 152.94,89.47 156.00,90.51 159.07,80.71 162.14,99.26 165.21,86.55 168.28,96.55 171.35,102.60 174.42,89.47 177.49,93.22 180.56,72.37 183.63,81.13 186.70,98.85 189.77,65.91 192.84,75.50 195.91,74.25 198.98,59.45 202.05,83.00 205.12,91.13 208.19,79.67 211.26,91.97 214.33,64.87 217.40,74.67 220.47,84.88 223.54,93.84 226.61,91.97 229.68,91.55 232.75,95.30 235.81,69.87 238.88,100.31 241.95,103.64 245.02,91.55 248.09,81.75 251.16,110.31 254.23,132.61 257.30,119.69 260.37,119.07 263.44,114.27 266.51,109.69 269.58,133.66 272.65,127.61 275.72,153.46 278.79,127.61 281.86,126.36 284.93,147.83 288.00,156.17 291.07,148.04 294.14,146.79 297.21,167.01 300.28,156.59 303.35,172.64 306.42,152.00 309.49,181.81 312.56,170.34 315.62,171.80 318.69,186.19 321.76,169.09 324.83,213.28 327.90,204.11 330.97,201.40 334.04,197.65 337.11,230.79 340.18,217.04 343.25,202.44 346.32,215.79 349.39,236.63 352.46,224.33 355.53,244.76 358.60,234.34 361.67,253.51 364.74,246.84 367.81,242.05 370.88,246.43 373.95,258.93 377.02,264.35 380.09,269.15 383.16,286.03 386.23,285.62 389.30,276.65 392.36,299.16 395.43,282.91 398.50,283.32 401.57,290.83 404.64,310.42 407.71,318.13 410.78,310.42 413.85,308.54 416.92,318.76 419.99,319.59 423.06,313.55 426.13,324.18 429.20,342.73 432.27,321.47 435.34,319.18 438.41,338.98 441.48,341.06 444.55,335.23 447.62,347.94 450.69,340.85 453.76,349.19 456.83,356.70 459.90,357.53 462.97,355.03 466.04,365.24 469.11,379.42 472.17,368.16 475.24,369.41 478.31,372.96 481.38,389.01 484.45,391.09 487.52,373.58 490.59,385.67 493.66,388.17 496.73,396.51 499.80,388.59 502.87,384.84 505.94,412.14 509.01,402.76 512.08,399.22 515.15,411.73 518.22,429.86 521.29,405.06 524.36,405.47 527.43,414.44 530.50,422.98 533.57,418.81 536.64,417.35 539.71,420.06 542.78,424.65 545.85,429.03 548.92,427.15 551.98,424.86 555.05,435.49 558.12,446.54 561.19,444.87 564.26,451.96 567.33,450.29 570.40,461.13 573.47,455.92 576.54,455.08 579.61,453.62 582.68,455.71 585.75,471.13 588.82,457.79 591.89,456.96 594.96,476.14 598.03,464.67 601.10,468.22 604.17,472.59 607.24,472.59 610.31,473.01 613.38,472.18 616.45,471.97 619.52,480.72 622.59,472.80 625.66,485.73 628.72,480.31 631.79,489.06 634.86,492.60 637.93,485.52 641.00,491.77 644.07,489.89 647.14,497.61 650.21,499.07 653.28,502.19 656.35,492.81 659.42,501.36 662.49,508.86 665.56,502.61 668.63,512.41 671.70,502.19 674.77,511.99 677.84,512.41 680.91,504.28 683.98,511.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,138.66 76.19,128.24 79.26,126.57 82.33,153.46 85.40,123.86 88.47,120.73 91.54,116.56 94.61,134.49 97.68,126.15 100.75,97.39 103.82,101.97 106.89,105.93 109.96,110.10 113.03,107.81 116.10,112.60 119.17,102.81 122.24,104.68 125.31,102.39 128.38,116.56 131.45,121.36 134.52,101.35 137.59,106.56 140.66,116.77 143.73,94.47 146.80,107.18 149.87,122.40 152.94,82.80 156.00,91.76 159.07,81.13 162.14,95.51 165.21,93.84 168.28,75.50 171.35,110.52 174.42,87.59 177.49,86.55 180.56,84.88 183.63,90.93 186.70,89.47 189.77,79.46 192.84,89.05 195.91,100.93 198.98,94.68 202.05,72.37 205.12,76.75 208.19,94.26 211.26,100.51 214.33,74.25 217.40,87.59 220.47,98.64 223.54,124.28 226.61,73.42 229.68,99.26 232.75,91.76 235.81,100.72 238.88,106.56 241.95,117.19 245.02,105.52 248.09,124.49 251.16,94.89 254.23,113.23 257.30,122.61 260.37,99.89 263.44,123.65 266.51,120.11 269.58,136.16 272.65,120.32 275.72,134.07 278.79,133.66 281.86,143.04 284.93,137.62 288.00,123.65 291.07,144.29 294.14,147.83 297.21,144.91 300.28,156.17 303.35,151.79 306.42,208.07 309.49,166.59 312.56,186.39 315.62,181.18 318.69,187.02 321.76,186.60 324.83,205.99 327.90,210.37 330.97,213.49 334.04,212.87 337.11,221.00 340.18,214.12 343.25,220.58 346.32,218.50 349.39,242.26 352.46,247.26 355.53,243.30 358.60,244.76 361.67,244.55 364.74,250.18 367.81,234.55 370.88,241.01 373.95,247.68 377.02,257.68 380.09,266.65 383.16,264.15 386.23,271.44 389.30,294.79 392.36,288.12 395.43,281.66 398.50,297.50 401.57,285.41 404.64,302.08 407.71,310.63 410.78,308.34 413.85,314.17 416.92,310.84 419.99,326.89 423.06,323.34 426.13,321.68 429.20,339.40 432.27,322.93 435.34,335.64 438.41,340.02 441.48,335.43 444.55,348.78 447.62,360.45 450.69,352.32 453.76,352.74 456.83,354.82 459.90,354.40 462.97,365.87 466.04,375.67 469.11,365.24 472.17,380.88 475.24,363.78 478.31,390.88 481.38,375.04 484.45,378.58 487.52,371.29 490.59,382.54 493.66,395.68 496.73,387.13 499.80,397.97 502.87,399.22 505.94,398.18 509.01,399.43 512.08,412.77 515.15,410.68 518.22,415.69 521.29,415.69 524.36,412.14 527.43,410.48 530.50,423.61 533.57,418.61 536.64,430.07 539.71,431.53 542.78,424.23 545.85,426.11 548.92,435.28 551.98,436.95 555.05,439.45 558.12,442.16 561.19,438.20 564.26,446.33 567.33,443.20 570.40,439.03 573.47,445.50 576.54,453.00 579.61,456.54 582.68,462.17 585.75,461.13 588.82,463.42 591.89,459.46 594.96,463.00 598.03,461.13 601.10,459.88 604.17,476.14 607.24,467.80 610.31,496.77 613.38,474.26 616.45,471.97 619.52,473.22 622.59,479.26 625.66,481.14 628.72,479.06 631.79,491.77 634.86,489.48 637.93,484.68 641.00,490.73 644.07,490.52 647.14,501.78 650.21,506.36 653.28,501.15 656.35,503.65 659.42,504.90 662.49,498.02 665.56,500.53 668.63,504.07 671.70,502.40 674.77,491.35 677.84,505.95 680.91,501.98 683.98,509.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,144.70 76.19,139.91 79.26,138.45 82.33,130.32 85.40,118.23 88.47,129.90 91.54,118.02 94.61,105.72 97.68,108.43 100.75,110.10 103.82,111.56 106.89,121.98 109.96,113.23 113.03,97.60 116.10,102.60 119.17,86.55 122.24,91.13 125.31,122.61 128.38,107.81 131.45,83.63 134.52,101.56 137.59,99.05 140.66,94.47 143.73,102.81 146.80,99.26 149.87,97.18 152.94,100.51 156.00,73.83 159.07,71.12 162.14,90.93 165.21,95.93 168.28,80.92 171.35,99.68 174.42,61.74 177.49,97.60 180.56,72.58 183.63,81.96 186.70,88.01 189.77,98.64 192.84,101.56 195.91,94.47 198.98,85.92 202.05,83.21 205.12,84.25 208.19,90.72 211.26,104.47 214.33,85.51 217.40,104.89 220.47,99.89 223.54,97.18 226.61,107.81 229.68,86.34 232.75,103.43 235.81,113.02 238.88,96.34 241.95,102.39 245.02,124.49 248.09,99.47 251.16,96.76 254.23,89.05 257.30,116.56 260.37,119.27 263.44,123.44 266.51,120.73 269.58,134.91 272.65,134.07 275.72,135.12 278.79,125.53 281.86,143.66 284.93,157.84 288.00,138.87 291.07,162.84 294.14,150.96 297.21,161.80 300.28,165.34 303.35,169.93 306.42,170.14 309.49,195.15 312.56,170.14 315.62,200.99 318.69,192.65 321.76,191.19 324.83,197.44 327.90,199.32 330.97,203.90 334.04,204.11 337.11,218.08 340.18,230.17 343.25,216.20 346.32,236.00 349.39,218.50 352.46,217.04 355.53,236.42 358.60,245.80 361.67,242.26 364.74,247.05 367.81,244.34 370.88,233.71 373.95,249.55 377.02,266.02 380.09,248.51 383.16,264.56 386.23,269.15 389.30,288.53 392.36,286.87 395.43,283.32 398.50,288.33 401.57,283.53 404.64,287.07 407.71,307.29 410.78,310.00 413.85,302.08 416.92,315.01 419.99,320.63 423.06,317.92 426.13,322.72 429.20,329.18 432.27,335.43 435.34,342.94 438.41,352.11 441.48,337.10 444.55,344.19 447.62,351.49 450.69,363.16 453.76,349.61 456.83,361.70 459.90,363.58 462.97,374.00 466.04,374.00 469.11,371.08 472.17,376.08 475.24,387.76 478.31,381.08 481.38,380.67 484.45,387.34 487.52,383.59 490.59,377.75 493.66,383.17 496.73,396.09 499.80,407.35 502.87,392.13 505.94,394.84 509.01,402.97 512.08,403.81 515.15,397.14 518.22,402.97 521.29,401.30 524.36,416.10 527.43,410.68 530.50,416.52 533.57,421.32 536.64,429.44 539.71,424.65 542.78,443.62 545.85,437.37 548.92,435.28 551.98,421.32 555.05,440.70 558.12,441.53 561.19,443.20 564.26,433.61 567.33,438.20 570.40,439.87 573.47,457.17 576.54,461.13 579.61,451.12 582.68,457.59 585.75,460.50 588.82,472.18 591.89,461.13 594.96,460.92 598.03,466.13 601.10,471.76 604.17,471.97 607.24,476.14 610.31,479.26 613.38,481.56 616.45,478.01 619.52,476.55 622.59,483.85 625.66,493.02 628.72,480.31 631.79,488.44 634.86,482.18 637.93,488.85 641.00,480.31 644.07,490.31 647.14,492.19 650.21,488.02 653.28,494.90 656.35,499.27 659.42,496.56 662.49,499.07 665.56,504.90 668.63,496.36 671.70,505.32 674.77,502.19 677.84,505.74 680.91,506.78 683.98,505.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,139.08 76.19,138.66 79.26,138.66 82.33,123.03 85.40,111.35 88.47,101.56 91.54,128.24 94.61,115.11 97.68,121.78 100.75,105.72 103.82,121.98 106.89,113.02 109.96,122.61 113.03,98.01 116.10,114.90 119.17,114.06 122.24,101.76 125.31,114.06 128.38,98.85 131.45,109.06 134.52,101.97 137.59,99.05 140.66,83.00 143.73,101.56 146.80,101.56 149.87,76.54 152.94,91.97 156.00,105.31 159.07,96.55 162.14,75.71 165.21,85.71 168.28,82.59 171.35,84.46 174.42,65.91 177.49,71.75 180.56,86.13 183.63,87.59 186.70,75.92 189.77,110.94 192.84,76.33 195.91,83.21 198.98,66.12 202.05,95.51 205.12,64.24 208.19,83.00 211.26,82.38 214.33,78.84 217.40,77.38 220.47,93.22 223.54,91.76 226.61,105.72 229.68,86.55 232.75,101.97 235.81,105.93 238.88,116.15 241.95,90.30 245.02,104.06 248.09,105.31 251.16,91.55 254.23,126.78 257.30,108.64 260.37,103.02 263.44,100.10 266.51,117.19 269.58,125.11 272.65,143.66 275.72,131.16 278.79,106.14 281.86,152.42 284.93,154.50 288.00,158.67 291.07,131.57 294.14,163.47 297.21,169.09 300.28,167.63 303.35,146.58 306.42,172.22 309.49,182.85 312.56,172.22 315.62,185.35 318.69,180.56 321.76,194.94 324.83,178.89 327.90,187.02 330.97,187.44 334.04,213.70 337.11,212.24 340.18,197.23 343.25,208.70 346.32,212.45 349.39,223.91 352.46,219.95 355.53,228.08 358.60,227.88 361.67,233.50 364.74,236.00 367.81,261.85 370.88,243.51 373.95,251.64 377.02,251.22 380.09,241.63 383.16,264.98 386.23,274.98 389.30,261.23 392.36,267.27 395.43,269.77 398.50,288.12 401.57,286.24 404.64,297.08 407.71,288.12 410.78,307.92 413.85,302.08 416.92,328.76 419.99,319.38 423.06,323.97 426.13,335.64 429.20,330.85 432.27,328.97 435.34,352.32 438.41,331.47 441.48,342.94 444.55,339.40 447.62,348.15 450.69,356.07 453.76,361.07 456.83,361.91 459.90,367.33 462.97,360.87 466.04,369.62 469.11,370.66 472.17,377.96 475.24,370.66 478.31,384.21 481.38,381.08 484.45,388.17 487.52,381.71 490.59,396.51 493.66,379.42 496.73,400.47 499.80,399.01 502.87,402.97 505.94,414.02 509.01,398.39 512.08,399.85 515.15,414.23 518.22,405.68 521.29,403.39 524.36,422.36 527.43,412.14 530.50,414.64 533.57,417.15 536.64,421.73 539.71,429.44 542.78,427.78 545.85,434.86 548.92,430.28 551.98,426.32 555.05,434.86 558.12,434.66 561.19,432.36 564.26,438.41 567.33,442.58 570.40,442.37 573.47,447.16 576.54,450.71 579.61,463.42 582.68,455.08 585.75,454.25 588.82,451.54 591.89,450.29 594.96,460.09 598.03,475.09 601.10,470.72 604.17,472.38 607.24,478.01 610.31,469.26 613.38,467.59 616.45,481.97 619.52,479.47 622.59,489.48 625.66,482.81 628.72,488.85 631.79,488.44 634.86,489.69 637.93,493.86 641.00,487.60 644.07,488.02 647.14,499.90 650.21,487.60 653.28,488.23 656.35,488.64 659.42,502.61 662.49,499.48 665.56,504.90 668.63,498.44 671.70,500.53 674.77,503.65 677.84,504.69 680.91,506.57 683.98,507.40 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,107.60 76.19,117.40 79.26,103.22 82.33,106.56 85.40,97.18 88.47,128.03 91.54,116.15 94.61,108.02 97.68,125.53 100.75,135.12 103.82,111.98 106.89,106.56 109.96,99.05 113.03,124.07 116.10,118.02 119.17,102.81 122.24,102.60 125.31,126.15 128.38,112.81 131.45,96.14 134.52,93.22 137.59,99.05 140.66,110.31 143.73,108.02 146.80,101.76 149.87,99.89 152.94,114.27 156.00,83.00 159.07,88.22 162.14,90.30 165.21,89.05 168.28,84.46 171.35,74.87 174.42,98.22 177.49,88.63 180.56,76.54 183.63,96.34 186.70,109.69 189.77,83.21 192.84,106.77 195.91,79.04 198.98,101.76 202.05,87.59 205.12,87.17 208.19,83.21 211.26,91.34 214.33,98.01 217.40,106.56 220.47,89.88 223.54,100.72 226.61,96.97 229.68,105.52 232.75,111.14 235.81,100.51 238.88,96.34 241.95,99.47 245.02,99.26 248.09,91.76 251.16,107.81 254.23,106.77 257.30,90.30 260.37,127.61 263.44,125.11 266.51,134.91 269.58,122.61 272.65,130.74 275.72,143.04 278.79,130.95 281.86,135.95 284.93,159.92 288.00,161.80 291.07,149.50 294.14,156.38 297.21,146.79 300.28,178.47 303.35,169.30 306.42,174.10 309.49,164.51 312.56,164.30 315.62,168.26 318.69,180.14 321.76,187.44 324.83,174.30 327.90,188.69 330.97,195.57 334.04,192.65 337.11,221.62 340.18,190.98 343.25,207.86 346.32,209.53 349.39,213.28 352.46,224.12 355.53,229.96 358.60,241.42 361.67,245.39 364.74,244.34 367.81,254.14 370.88,250.60 373.95,260.81 377.02,268.94 380.09,254.77 383.16,281.45 386.23,284.99 389.30,272.07 392.36,284.78 395.43,282.28 398.50,284.57 401.57,295.41 404.64,296.87 407.71,312.30 410.78,306.88 413.85,288.95 416.92,310.21 419.99,323.97 423.06,340.85 426.13,330.85 429.20,344.40 432.27,335.23 435.34,336.06 438.41,347.73 441.48,354.82 444.55,350.03 447.62,360.03 450.69,356.70 453.76,357.11 456.83,358.36 459.90,364.20 462.97,360.03 466.04,360.24 469.11,370.04 472.17,375.67 475.24,387.13 478.31,375.25 481.38,371.08 484.45,381.50 487.52,386.30 490.59,393.38 493.66,386.30 496.73,401.30 499.80,403.39 502.87,400.26 505.94,401.30 509.01,407.97 512.08,408.39 515.15,399.01 518.22,419.44 521.29,417.15 524.36,412.14 527.43,411.31 530.50,417.56 533.57,425.07 536.64,401.30 539.71,429.03 542.78,432.15 545.85,418.81 548.92,434.66 551.98,438.41 555.05,437.16 558.12,435.07 561.19,442.58 564.26,454.46 567.33,443.41 570.40,449.25 573.47,445.91 576.54,457.38 579.61,458.84 582.68,455.50 585.75,458.63 588.82,471.76 591.89,458.42 594.96,460.09 598.03,461.13 601.10,462.59 604.17,479.26 607.24,470.72 610.31,478.01 613.38,471.34 616.45,476.76 619.52,482.39 622.59,480.10 625.66,485.10 628.72,485.10 631.79,487.39 634.86,490.94 637.93,491.15 641.00,491.98 644.07,496.77 647.14,504.90 650.21,501.15 653.28,498.02 656.35,495.73 659.42,501.57 662.49,501.98 665.56,498.44 668.63,509.49 671.70,505.32 674.77,503.65 677.84,510.11 680.91,511.57 683.98,510.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,148.04 76.19,143.66 79.26,133.87 82.33,140.95 85.40,131.78 88.47,139.29 91.54,139.91 94.61,103.64 97.68,118.44 100.75,123.03 103.82,110.73 106.89,100.72 109.96,123.44 113.03,113.85 116.10,120.94 119.17,116.98 122.24,121.98 125.31,118.44 128.38,122.40 131.45,108.02 134.52,112.60 137.59,106.98 140.66,104.27 143.73,107.39 146.80,76.33 149.87,101.76 152.94,89.47 156.00,111.56 159.07,95.30 162.14,92.38 165.21,96.97 168.28,97.18 171.35,76.96 174.42,71.12 177.49,93.63 180.56,65.70 183.63,75.29 186.70,57.36 189.77,78.42 192.84,71.33 195.91,80.50 198.98,65.49 202.05,75.92 205.12,78.00 208.19,81.13 211.26,88.01 214.33,79.04 217.40,58.62 220.47,80.29 223.54,78.42 226.61,95.72 229.68,89.88 232.75,100.31 235.81,102.39 238.88,111.98 241.95,112.60 245.02,93.84 248.09,94.47 251.16,122.19 254.23,117.40 257.30,104.68 260.37,121.36 263.44,124.07 266.51,121.15 269.58,123.03 272.65,147.21 275.72,132.82 278.79,139.91 281.86,133.45 284.93,140.54 288.00,157.84 291.07,145.33 294.14,163.47 297.21,173.47 300.28,170.34 303.35,181.81 306.42,183.06 309.49,182.02 312.56,195.36 315.62,176.60 318.69,203.49 321.76,203.90 324.83,174.72 327.90,186.19 330.97,200.78 334.04,208.28 337.11,214.95 340.18,214.53 343.25,226.21 346.32,226.62 349.39,246.43 352.46,236.63 355.53,236.84 358.60,226.83 361.67,227.04 364.74,257.68 367.81,240.80 370.88,251.43 373.95,243.30 377.02,255.81 380.09,261.02 383.16,269.15 386.23,274.78 389.30,269.57 392.36,288.12 395.43,279.78 398.50,289.37 401.57,285.41 404.64,295.41 407.71,312.30 410.78,306.46 413.85,307.92 416.92,306.25 419.99,311.88 423.06,314.80 426.13,331.06 429.20,326.68 432.27,330.22 435.34,329.39 438.41,332.72 441.48,350.03 444.55,343.15 447.62,357.95 450.69,346.69 453.76,350.03 456.83,358.99 459.90,358.78 462.97,370.45 466.04,361.70 469.11,368.58 472.17,381.08 475.24,385.46 478.31,373.58 481.38,381.71 484.45,376.71 487.52,384.42 490.59,379.63 493.66,400.05 496.73,398.18 499.80,393.17 502.87,396.51 505.94,397.34 509.01,407.35 512.08,397.34 515.15,414.64 518.22,415.27 521.29,412.77 524.36,415.48 527.43,421.73 530.50,416.73 533.57,424.44 536.64,423.40 539.71,437.16 542.78,431.74 545.85,431.95 548.92,442.37 551.98,423.40 555.05,435.49 558.12,433.82 561.19,427.36 564.26,439.45 567.33,437.37 570.40,442.58 573.47,442.16 576.54,458.84 579.61,453.62 582.68,456.33 585.75,455.92 588.82,463.84 591.89,458.63 594.96,465.09 598.03,466.76 601.10,462.59 604.17,469.26 607.24,469.88 610.31,474.89 613.38,475.51 616.45,473.22 619.52,482.39 622.59,478.43 625.66,489.89 628.72,487.60 631.79,486.56 634.86,485.10 637.93,495.31 641.00,473.01 644.07,488.85 647.14,498.02 650.21,488.85 653.28,501.78 656.35,504.28 659.42,501.78 662.49,497.40 665.56,497.40 668.63,500.73 671.70,515.12 674.77,503.65 677.84,501.57 680.91,506.36 683.98,517.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,147.21 76.19,142.62 79.26,126.78 82.33,114.90 85.40,129.70 88.47,111.56 91.54,142.41 94.61,116.77 97.68,121.15 100.75,126.99 103.82,135.53 106.89,125.53 109.96,114.27 113.03,120.32 116.10,120.94 119.17,120.73 122.24,98.43 125.31,105.72 128.38,118.65 131.45,97.39 134.52,106.56 137.59,97.60 140.66,100.10 143.73,84.46 146.80,122.40 149.87,100.10 152.94,130.74 156.00,96.97 159.07,100.72 162.14,96.34 165.21,84.25 168.28,78.21 171.35,89.88 174.42,100.72 177.49,89.05 180.56,91.97 183.63,95.72 186.70,91.55 189.77,70.91 192.84,84.05 195.91,90.09 198.98,86.55 202.05,78.84 205.12,81.75 208.19,80.50 211.26,71.96 214.33,67.16 217.40,89.05 220.47,90.09 223.54,90.09 226.61,94.05 229.68,79.04 232.75,109.48 235.81,103.43 238.88,104.27 241.95,113.02 245.02,111.14 248.09,109.69 251.16,103.64 254.23,104.27 257.30,127.82 260.37,106.14 263.44,95.72 266.51,126.15 269.58,140.12 272.65,116.15 275.72,114.06 278.79,129.90 281.86,149.50 284.93,145.12 288.00,136.16 291.07,127.40 294.14,160.76 297.21,161.17 300.28,162.63 303.35,154.08 306.42,153.04 309.49,177.85 312.56,181.81 315.62,178.26 318.69,192.02 321.76,183.89 324.83,199.11 327.90,187.44 330.97,202.65 334.04,199.53 337.11,226.83 340.18,234.96 343.25,231.63 346.32,223.91 349.39,216.41 352.46,219.33 355.53,229.54 358.60,234.96 361.67,257.68 364.74,236.84 367.81,251.43 370.88,261.44 373.95,262.89 377.02,267.69 380.09,252.06 383.16,266.02 386.23,270.19 389.30,270.82 392.36,277.07 395.43,290.41 398.50,296.87 401.57,299.58 404.64,285.82 407.71,300.21 410.78,283.11 413.85,293.12 416.92,314.59 419.99,310.00 423.06,322.51 426.13,316.47 429.20,326.89 432.27,333.98 435.34,338.35 438.41,346.90 441.48,362.74 444.55,348.15 447.62,352.53 450.69,354.82 453.76,357.53 456.83,361.70 459.90,377.12 462.97,374.41 466.04,363.99 469.11,373.58 472.17,369.83 475.24,374.62 478.31,378.58 481.38,375.46 484.45,394.84 487.52,397.34 490.59,389.01 493.66,391.92 496.73,390.67 499.80,394.84 502.87,398.80 505.94,407.35 509.01,399.64 512.08,399.85 515.15,415.27 518.22,420.90 521.29,410.48 524.36,408.39 527.43,421.32 530.50,423.61 533.57,426.94 536.64,419.65 539.71,422.36 542.78,431.32 545.85,430.07 548.92,437.78 551.98,441.33 555.05,436.12 558.12,440.49 561.19,441.12 564.26,448.41 567.33,462.38 570.40,448.00 573.47,447.37 576.54,451.12 579.61,456.13 582.68,453.62 585.75,449.25 588.82,460.71 591.89,460.71 594.96,468.63 598.03,457.59 601.10,468.63 604.17,463.21 607.24,470.51 610.31,471.55 613.38,477.18 616.45,479.26 619.52,480.10 622.59,480.51 625.66,483.85 628.72,495.31 631.79,485.31 634.86,495.73 637.93,484.47 641.00,492.60 644.07,493.86 647.14,489.06 650.21,494.27 653.28,493.44 656.35,502.19 659.42,500.32 662.49,503.44 665.56,502.82 668.63,506.36 671.70,504.69 674.77,505.95 677.84,505.53 680.91,514.28 683.98,505.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,123.23 76.19,132.82 79.26,127.20 82.33,126.36 85.40,112.81 88.47,129.90 91.54,125.32 94.61,132.61 97.68,113.23 100.75,102.81 103.82,105.52 106.89,100.93 109.96,101.76 113.03,101.76 116.10,107.18 119.17,104.89 122.24,104.06 125.31,135.53 128.38,102.39 131.45,100.93 134.52,94.89 137.59,126.99 140.66,110.52 143.73,80.29 146.80,102.18 149.87,85.51 152.94,73.21 156.00,97.80 159.07,87.17 162.14,95.09 165.21,77.38 168.28,64.04 171.35,101.14 174.42,81.96 177.49,69.45 180.56,94.47 183.63,92.38 186.70,74.04 189.77,61.95 192.84,74.04 195.91,78.63 198.98,57.99 202.05,77.38 205.12,86.96 208.19,81.13 211.26,66.75 214.33,90.51 217.40,86.76 220.47,79.46 223.54,79.46 226.61,100.51 229.68,82.59 232.75,89.67 235.81,94.05 238.88,116.15 241.95,102.39 245.02,90.51 248.09,83.21 251.16,99.68 254.23,93.22 257.30,105.93 260.37,111.14 263.44,129.28 266.51,137.41 269.58,131.16 272.65,119.27 275.72,129.49 278.79,109.69 281.86,128.65 284.93,143.87 288.00,146.79 291.07,150.12 294.14,163.05 297.21,154.92 300.28,163.05 303.35,156.79 306.42,160.34 309.49,183.06 312.56,173.05 315.62,190.35 318.69,171.59 321.76,184.31 324.83,205.15 327.90,205.57 330.97,207.86 334.04,175.76 337.11,186.81 340.18,214.95 343.25,216.62 346.32,235.17 349.39,237.46 352.46,234.13 355.53,227.46 358.60,243.51 361.67,238.71 364.74,252.47 367.81,246.22 370.88,249.35 373.95,253.10 377.02,261.02 380.09,256.64 383.16,272.69 386.23,281.86 389.30,275.82 392.36,290.20 395.43,288.95 398.50,283.32 401.57,286.24 404.64,290.20 407.71,296.04 410.78,309.59 413.85,311.46 416.92,317.30 419.99,319.80 423.06,323.34 426.13,330.85 429.20,327.31 432.27,328.76 435.34,343.77 438.41,346.07 441.48,346.27 444.55,351.90 447.62,351.28 450.69,354.40 453.76,350.44 456.83,365.66 459.90,362.32 462.97,360.24 466.04,368.16 469.11,371.91 472.17,375.67 475.24,382.13 478.31,383.79 481.38,380.46 484.45,390.67 487.52,391.09 490.59,385.05 493.66,393.17 496.73,384.63 499.80,386.50 502.87,395.88 505.94,396.09 509.01,396.30 512.08,403.81 515.15,404.64 518.22,414.02 521.29,418.61 524.36,420.90 527.43,419.44 530.50,421.32 533.57,416.52 536.64,430.07 539.71,432.78 542.78,421.32 545.85,434.03 548.92,434.66 551.98,427.36 555.05,430.90 558.12,431.53 561.19,450.29 564.26,445.91 567.33,452.37 570.40,446.54 573.47,455.29 576.54,452.37 579.61,449.25 582.68,457.59 585.75,456.13 588.82,468.42 591.89,471.76 594.96,459.88 598.03,466.76 601.10,469.88 604.17,471.97 607.24,470.72 610.31,470.09 613.38,487.39 616.45,476.55 619.52,486.98 622.59,483.02 625.66,482.18 628.72,485.93 631.79,479.89 634.86,489.69 637.93,494.06 641.00,490.73 644.07,488.44 647.14,497.82 650.21,491.56 653.28,497.19 656.35,505.74 659.42,502.19 662.49,505.11 665.56,504.49 668.63,504.90 671.70,510.74 674.77,501.57 677.84,509.49 680.91,511.57 683.98,509.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,123.65 76.19,130.11 79.26,131.78 82.33,134.91 85.40,118.44 88.47,128.86 91.54,124.28 94.61,123.23 97.68,123.44 100.75,122.61 103.82,100.31 106.89,112.81 109.96,92.18 113.03,111.98 116.10,98.43 119.17,98.01 122.24,96.55 125.31,109.48 128.38,87.80 131.45,99.47 134.52,93.63 137.59,85.51 140.66,93.43 143.73,98.43 146.80,103.64 149.87,111.98 152.94,71.33 156.00,86.96 159.07,95.30 162.14,90.30 165.21,82.17 168.28,101.35 171.35,84.46 174.42,92.80 177.49,74.46 180.56,98.01 183.63,77.58 186.70,84.88 189.77,64.04 192.84,80.71 195.91,81.75 198.98,78.42 202.05,91.34 205.12,79.04 208.19,70.08 211.26,82.80 214.33,89.26 217.40,93.84 220.47,76.75 223.54,99.47 226.61,91.34 229.68,93.63 232.75,105.72 235.81,101.97 238.88,96.97 241.95,116.36 245.02,105.31 248.09,102.39 251.16,94.68 254.23,115.31 257.30,109.48 260.37,112.60 263.44,106.35 266.51,128.24 269.58,149.71 272.65,125.11 275.72,127.61 278.79,141.16 281.86,126.57 284.93,168.88 288.00,134.49 291.07,147.62 294.14,156.17 297.21,172.01 300.28,168.26 303.35,161.80 306.42,175.56 309.49,188.27 312.56,171.59 315.62,173.05 318.69,188.69 321.76,182.85 324.83,168.05 327.90,196.40 330.97,196.61 334.04,197.03 337.11,205.99 340.18,213.28 343.25,233.30 346.32,220.16 349.39,222.04 352.46,228.29 355.53,236.21 358.60,239.34 361.67,241.01 364.74,244.34 367.81,255.39 370.88,262.69 373.95,247.26 377.02,260.81 380.09,268.31 383.16,261.64 386.23,282.07 389.30,281.86 392.36,284.78 395.43,300.42 398.50,296.66 401.57,292.91 404.64,303.13 407.71,307.50 410.78,305.84 413.85,301.87 416.92,322.93 419.99,322.09 423.06,332.72 426.13,329.60 429.20,349.61 432.27,333.56 435.34,333.35 438.41,349.19 441.48,347.32 444.55,342.94 447.62,342.52 450.69,351.28 453.76,333.56 456.83,358.57 459.90,362.95 462.97,372.54 466.04,364.20 469.11,382.54 472.17,366.28 475.24,359.20 478.31,377.75 481.38,382.54 484.45,391.30 487.52,383.59 490.59,383.79 493.66,383.59 496.73,386.09 499.80,394.63 502.87,391.09 505.94,404.01 509.01,401.93 512.08,406.93 515.15,407.35 518.22,399.22 521.29,421.52 524.36,408.60 527.43,429.24 530.50,417.98 533.57,423.40 536.64,425.90 539.71,426.11 542.78,430.49 545.85,426.94 548.92,435.07 551.98,429.44 555.05,437.99 558.12,439.87 561.19,433.41 564.26,439.66 567.33,450.91 570.40,448.62 573.47,451.96 576.54,446.75 579.61,454.04 582.68,454.46 585.75,458.21 588.82,453.62 591.89,469.26 594.96,456.75 598.03,467.80 601.10,466.13 604.17,470.09 607.24,475.51 610.31,473.22 613.38,475.51 616.45,478.43 619.52,480.31 622.59,479.68 625.66,485.31 628.72,488.23 631.79,486.56 634.86,481.77 637.93,485.73 641.00,482.60 644.07,488.85 647.14,498.02 650.21,492.60 653.28,490.52 656.35,495.11 659.42,492.19 662.49,491.77 665.56,494.27 668.63,499.27 671.70,512.62 674.77,499.69 677.84,512.62 680.91,506.78 683.98,508.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,129.28 76.19,142.62 79.26,151.58 82.33,111.77 85.40,134.07 88.47,141.79 91.54,133.87 94.61,123.86 97.68,108.85 100.75,119.48 103.82,117.61 106.89,98.64 109.96,101.76 113.03,115.31 116.10,101.35 119.17,115.94 122.24,91.97 125.31,90.30 128.38,102.39 131.45,81.34 134.52,102.39 137.59,94.68 140.66,93.01 143.73,90.09 146.80,80.09 149.87,90.09 152.94,79.88 156.00,88.22 159.07,90.72 162.14,94.05 165.21,86.55 168.28,74.04 171.35,92.80 174.42,83.21 177.49,89.88 180.56,101.76 183.63,87.80 186.70,86.76 189.77,72.79 192.84,71.12 195.91,85.51 198.98,57.36 202.05,91.55 205.12,85.71 208.19,74.25 211.26,95.72 214.33,70.08 217.40,88.84 220.47,94.68 223.54,90.72 226.61,83.00 229.68,113.65 232.75,96.34 235.81,115.11 238.88,110.10 241.95,110.10 245.02,96.55 248.09,134.28 251.16,112.19 254.23,118.02 257.30,110.52 260.37,112.81 263.44,117.61 266.51,125.74 269.58,123.23 272.65,115.73 275.72,132.82 278.79,137.41 281.86,115.73 284.93,130.11 288.00,146.79 291.07,154.29 294.14,151.17 297.21,142.83 300.28,156.79 303.35,147.83 306.42,161.17 309.49,173.68 312.56,171.39 315.62,169.51 318.69,189.94 321.76,183.06 324.83,188.27 327.90,187.44 330.97,193.06 334.04,203.07 337.11,218.70 340.18,221.00 343.25,219.12 346.32,205.57 349.39,215.37 352.46,218.08 355.53,226.21 358.60,241.84 361.67,233.50 364.74,238.30 367.81,252.68 370.88,258.31 373.95,262.06 377.02,254.56 380.09,249.76 383.16,279.15 386.23,282.28 389.30,293.95 392.36,293.75 395.43,281.66 398.50,269.98 401.57,300.42 404.64,301.04 407.71,310.63 410.78,307.09 413.85,303.13 416.92,308.13 419.99,323.55 423.06,311.67 426.13,302.92 429.20,328.97 432.27,318.97 435.34,347.11 438.41,320.43 441.48,349.61 444.55,357.95 447.62,354.19 450.69,359.20 453.76,349.61 456.83,351.49 459.90,364.62 462.97,359.20 466.04,372.96 469.11,372.54 472.17,362.32 475.24,386.92 478.31,373.37 481.38,376.71 484.45,380.46 487.52,393.17 490.59,391.30 493.66,397.76 496.73,390.88 499.80,385.88 502.87,396.93 505.94,408.81 509.01,399.64 512.08,409.02 515.15,409.64 518.22,412.14 521.29,407.77 524.36,420.06 527.43,413.39 530.50,412.35 533.57,421.52 536.64,422.57 539.71,423.40 542.78,432.78 545.85,427.15 548.92,433.20 551.98,435.70 555.05,432.57 558.12,444.45 561.19,442.79 564.26,443.41 567.33,435.28 570.40,452.58 573.47,442.16 576.54,453.21 579.61,459.67 582.68,467.17 585.75,461.34 588.82,447.79 591.89,462.59 594.96,461.34 598.03,459.46 601.10,473.22 604.17,471.55 607.24,478.01 610.31,480.72 613.38,475.93 616.45,473.43 619.52,487.18 622.59,475.30 625.66,489.06 628.72,487.81 631.79,491.15 634.86,489.89 637.93,488.64 641.00,494.69 644.07,492.19 647.14,499.07 650.21,499.27 653.28,500.32 656.35,503.86 659.42,492.81 662.49,501.78 665.56,505.32 668.63,507.20 671.70,503.03 674.77,509.07 677.84,501.98 680.91,513.03 683.98,505.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,131.57 76.19,132.41 79.26,123.23 82.33,121.98 85.40,133.66 88.47,136.99 91.54,100.72 94.61,112.81 97.68,135.32 100.75,107.39 103.82,99.68 106.89,114.69 109.96,114.69 113.03,109.69 116.10,106.14 119.17,116.36 122.24,93.22 125.31,80.09 128.38,100.10 131.45,92.38 134.52,81.96 137.59,85.30 140.66,83.84 143.73,100.10 146.80,95.51 149.87,92.18 152.94,105.93 156.00,87.80 159.07,90.30 162.14,88.63 165.21,75.29 168.28,93.84 171.35,82.59 174.42,70.91 177.49,84.67 180.56,98.22 183.63,78.42 186.70,101.35 189.77,93.01 192.84,78.84 195.91,80.71 198.98,87.38 202.05,90.72 205.12,86.96 208.19,99.89 211.26,98.22 214.33,73.21 217.40,95.93 220.47,95.51 223.54,98.22 226.61,91.76 229.68,95.72 232.75,102.81 235.81,107.18 238.88,100.31 241.95,119.69 245.02,99.26 248.09,118.44 251.16,113.02 254.23,102.60 257.30,124.49 260.37,138.66 263.44,92.38 266.51,123.23 269.58,123.44 272.65,128.45 275.72,124.69 278.79,128.03 281.86,137.83 284.93,138.66 288.00,152.83 291.07,142.20 294.14,148.04 297.21,161.17 300.28,154.92 303.35,164.92 306.42,170.14 309.49,184.73 312.56,170.97 315.62,191.40 318.69,188.90 321.76,189.94 324.83,194.52 327.90,189.73 330.97,216.41 334.04,184.52 337.11,207.86 340.18,194.94 343.25,212.03 346.32,223.29 349.39,236.84 352.46,228.29 355.53,225.37 358.60,243.51 361.67,244.55 364.74,248.93 367.81,259.56 370.88,255.60 373.95,248.30 377.02,239.97 380.09,260.18 383.16,264.15 386.23,279.99 389.30,272.69 392.36,274.78 395.43,299.16 398.50,274.36 401.57,281.66 404.64,287.91 407.71,291.66 410.78,307.50 413.85,303.33 416.92,320.43 419.99,328.76 423.06,326.05 426.13,336.06 429.20,326.47 432.27,326.68 435.34,339.19 438.41,344.40 441.48,347.94 444.55,349.61 447.62,354.40 450.69,359.20 453.76,362.12 456.83,365.24 459.90,362.53 462.97,372.54 466.04,387.13 469.11,378.79 472.17,365.03 475.24,379.00 478.31,383.59 481.38,398.39 484.45,383.17 487.52,388.80 490.59,395.26 493.66,387.76 496.73,395.68 499.80,400.68 502.87,410.68 505.94,390.88 509.01,404.22 512.08,414.85 515.15,404.64 518.22,410.27 521.29,409.64 524.36,410.89 527.43,421.11 530.50,416.10 533.57,427.15 536.64,420.27 539.71,427.57 542.78,421.94 545.85,431.53 548.92,438.62 551.98,438.62 555.05,439.87 558.12,444.66 561.19,440.28 564.26,445.50 567.33,441.95 570.40,453.42 573.47,450.91 576.54,455.71 579.61,445.29 582.68,457.59 585.75,460.29 588.82,467.17 591.89,459.46 594.96,469.05 598.03,466.97 601.10,468.01 604.17,477.18 607.24,472.80 610.31,477.80 613.38,484.06 616.45,481.35 619.52,489.48 622.59,476.55 625.66,475.93 628.72,490.10 631.79,482.18 634.86,486.56 637.93,493.65 641.00,488.64 644.07,484.68 647.14,498.65 650.21,498.23 653.28,501.98 656.35,497.61 659.42,498.02 662.49,493.44 665.56,506.15 668.63,496.15 671.70,502.19 674.77,504.69 677.84,512.62 680.91,509.70 683.98,507.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,133.03 76.19,142.83 79.26,120.11 82.33,100.10 85.40,119.27 88.47,144.50 91.54,105.93 94.61,109.06 97.68,111.77 100.75,109.48 103.82,93.43 106.89,114.06 109.96,121.57 113.03,117.40 116.10,105.93 119.17,121.15 122.24,105.72 125.31,99.89 128.38,96.76 131.45,106.98 134.52,87.17 137.59,91.97 140.66,93.22 143.73,103.02 146.80,83.21 149.87,91.34 152.94,99.47 156.00,78.84 159.07,83.42 162.14,84.88 165.21,60.07 168.28,75.50 171.35,102.39 174.42,65.08 177.49,77.58 180.56,95.09 183.63,91.13 186.70,83.42 189.77,88.42 192.84,63.83 195.91,90.93 198.98,70.29 202.05,78.63 205.12,81.13 208.19,92.59 211.26,102.60 214.33,81.75 217.40,72.58 220.47,101.56 223.54,102.60 226.61,86.96 229.68,102.39 232.75,100.93 235.81,87.38 238.88,109.48 241.95,108.23 245.02,120.32 248.09,104.68 251.16,104.47 254.23,141.16 257.30,120.73 260.37,109.69 263.44,119.27 266.51,136.78 269.58,121.15 272.65,135.32 275.72,126.99 278.79,132.20 281.86,145.33 284.93,127.40 288.00,153.25 291.07,129.28 294.14,154.71 297.21,160.55 300.28,172.64 303.35,171.39 306.42,173.68 309.49,184.10 312.56,181.39 315.62,184.31 318.69,187.64 321.76,189.10 324.83,198.48 327.90,197.03 330.97,207.45 334.04,210.57 337.11,212.03 340.18,220.58 343.25,216.62 346.32,224.54 349.39,218.70 352.46,217.66 355.53,237.05 358.60,249.55 361.67,240.17 364.74,262.69 367.81,249.76 370.88,257.68 373.95,253.51 377.02,265.40 380.09,268.31 383.16,266.65 386.23,261.85 389.30,291.24 392.36,277.49 395.43,285.41 398.50,296.87 401.57,296.04 404.64,294.58 407.71,301.67 410.78,291.66 413.85,319.59 416.92,320.63 419.99,323.97 423.06,315.63 426.13,336.69 429.20,327.72 432.27,347.52 435.34,342.31 438.41,356.70 441.48,344.81 444.55,348.15 447.62,371.70 450.69,353.36 453.76,358.16 456.83,356.70 459.90,362.32 462.97,371.29 466.04,369.20 469.11,377.75 472.17,380.25 475.24,374.62 478.31,376.71 481.38,375.25 484.45,386.92 487.52,392.13 490.59,392.76 493.66,387.13 496.73,401.72 499.80,387.34 502.87,390.26 505.94,396.09 509.01,392.97 512.08,414.02 515.15,395.05 518.22,412.14 521.29,414.85 524.36,409.64 527.43,405.26 530.50,422.98 533.57,417.35 536.64,420.06 539.71,432.15 542.78,428.19 545.85,426.11 548.92,428.19 551.98,446.75 555.05,430.70 558.12,445.50 561.19,442.99 564.26,437.99 567.33,442.99 570.40,451.54 573.47,455.92 576.54,463.63 579.61,468.22 582.68,456.33 585.75,463.21 588.82,455.92 591.89,462.59 594.96,468.01 598.03,473.43 601.10,468.42 604.17,471.13 607.24,474.05 610.31,477.39 613.38,481.56 616.45,482.18 619.52,490.94 622.59,495.31 625.66,475.30 628.72,474.26 631.79,486.77 634.86,488.44 637.93,486.77 641.00,494.90 644.07,493.86 647.14,494.27 650.21,489.06 653.28,490.94 656.35,493.86 659.42,505.74 662.49,502.82 665.56,500.11 668.63,507.20 671.70,501.15 674.77,515.12 677.84,505.53 680.91,505.95 683.98,513.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,113.85 76.19,136.16 79.26,119.07 82.33,118.02 85.40,118.23 88.47,146.16 91.54,121.36 94.61,124.28 97.68,112.40 100.75,120.32 103.82,109.06 106.89,128.65 109.96,110.52 113.03,110.73 116.10,104.68 119.17,111.98 122.24,118.23 125.31,104.27 128.38,134.28 131.45,114.48 134.52,94.47 137.59,90.09 140.66,91.76 143.73,88.22 146.80,73.83 149.87,81.34 152.94,88.84 156.00,81.34 159.07,83.21 162.14,96.76 165.21,84.46 168.28,81.34 171.35,68.00 174.42,74.46 177.49,83.21 180.56,83.63 183.63,82.38 186.70,75.50 189.77,81.54 192.84,64.87 195.91,90.72 198.98,69.87 202.05,77.38 205.12,67.79 208.19,97.39 211.26,97.80 214.33,84.88 217.40,87.38 220.47,80.71 223.54,96.34 226.61,91.55 229.68,88.01 232.75,104.27 235.81,100.51 238.88,93.22 241.95,102.60 245.02,97.18 248.09,116.77 251.16,110.52 254.23,113.23 257.30,111.98 260.37,109.27 263.44,116.56 266.51,134.49 269.58,117.40 272.65,116.77 275.72,127.82 278.79,139.70 281.86,133.03 284.93,143.66 288.00,160.96 291.07,141.79 294.14,166.17 297.21,148.04 300.28,163.26 303.35,171.39 306.42,177.64 309.49,159.30 312.56,174.72 315.62,175.76 318.69,171.18 321.76,176.81 324.83,204.32 327.90,211.82 330.97,206.82 334.04,212.03 337.11,192.65 340.18,211.82 343.25,224.33 346.32,213.28 349.39,232.88 352.46,237.26 355.53,233.71 358.60,234.96 361.67,230.38 364.74,235.17 367.81,256.85 370.88,254.56 373.95,247.47 377.02,259.77 380.09,250.60 383.16,272.48 386.23,268.52 389.30,269.98 392.36,283.11 395.43,286.87 398.50,296.45 401.57,302.08 404.64,292.29 407.71,278.95 410.78,304.79 413.85,305.63 416.92,319.18 419.99,316.26 423.06,322.51 426.13,329.60 429.20,323.97 432.27,348.98 435.34,340.02 438.41,342.10 441.48,352.94 444.55,344.40 447.62,372.75 450.69,351.90 453.76,351.49 456.83,348.36 459.90,367.12 462.97,371.08 466.04,361.28 469.11,381.08 472.17,382.75 475.24,372.33 478.31,379.21 481.38,395.26 484.45,390.67 487.52,396.30 490.59,385.05 493.66,387.13 496.73,397.97 499.80,415.69 502.87,403.60 505.94,411.73 509.01,405.26 512.08,409.64 515.15,401.93 518.22,406.52 521.29,418.81 524.36,413.39 527.43,420.69 530.50,420.06 533.57,417.98 536.64,417.15 539.71,439.03 542.78,423.82 545.85,433.82 548.92,430.28 551.98,434.24 555.05,437.57 558.12,439.24 561.19,439.66 564.26,439.45 567.33,460.29 570.40,450.08 573.47,437.37 576.54,446.12 579.61,450.29 582.68,457.17 585.75,460.29 588.82,461.55 591.89,466.97 594.96,466.34 598.03,468.42 601.10,473.43 604.17,469.68 607.24,474.47 610.31,480.10 613.38,475.93 616.45,477.80 619.52,472.18 622.59,481.77 625.66,482.81 628.72,477.18 631.79,484.27 634.86,481.77 637.93,477.80 641.00,491.77 644.07,489.27 647.14,495.11 650.21,488.85 653.28,500.11 656.35,489.89 659.42,498.65 662.49,506.15 665.56,502.19 668.63,495.11 671.70,503.86 674.77,504.90 677.84,510.95 680.91,503.03 683.98,506.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,129.70 76.19,103.02 79.26,128.45 82.33,121.78 85.40,120.52 88.47,132.20 91.54,134.28 94.61,138.45 97.68,107.60 100.75,125.94 103.82,110.94 106.89,114.06 109.96,128.86 113.03,125.11 116.10,104.68 119.17,133.66 122.24,102.39 125.31,96.55 128.38,115.94 131.45,98.85 134.52,106.98 137.59,95.72 140.66,104.27 143.73,105.72 146.80,111.77 149.87,97.80 152.94,94.68 156.00,92.38 159.07,85.30 162.14,74.46 165.21,96.76 168.28,86.13 171.35,100.10 174.42,81.96 177.49,83.42 180.56,82.38 183.63,76.75 186.70,76.96 189.77,80.71 192.84,96.34 195.91,71.33 198.98,91.97 202.05,91.76 205.12,87.17 208.19,94.89 211.26,86.55 214.33,84.67 217.40,76.33 220.47,68.83 223.54,73.42 226.61,86.55 229.68,77.38 232.75,79.67 235.81,89.47 238.88,92.80 241.95,94.47 245.02,104.47 248.09,88.01 251.16,88.22 254.23,117.19 257.30,120.94 260.37,99.47 263.44,115.11 266.51,106.56 269.58,123.03 272.65,129.28 275.72,136.58 278.79,129.49 281.86,127.20 284.93,141.58 288.00,144.29 291.07,149.29 294.14,143.04 297.21,172.01 300.28,173.47 303.35,178.89 306.42,158.88 309.49,158.67 312.56,186.60 315.62,191.61 318.69,187.23 321.76,185.77 324.83,209.12 327.90,183.68 330.97,206.61 334.04,207.86 337.11,213.28 340.18,214.95 343.25,212.03 346.32,227.88 349.39,231.63 352.46,231.21 355.53,252.26 358.60,232.67 361.67,237.05 364.74,250.18 367.81,236.21 370.88,256.22 373.95,256.64 377.02,262.48 380.09,260.81 383.16,259.14 386.23,280.82 389.30,291.45 392.36,289.58 395.43,288.12 398.50,292.91 401.57,293.54 404.64,292.29 407.71,297.29 410.78,299.16 413.85,320.01 416.92,311.46 419.99,303.75 423.06,321.26 426.13,330.43 429.20,328.14 432.27,342.52 435.34,337.10 438.41,341.06 441.48,347.94 444.55,333.35 447.62,352.74 450.69,357.32 453.76,355.45 456.83,366.49 459.90,361.91 462.97,377.54 466.04,372.54 469.11,363.58 472.17,376.29 475.24,377.12 478.31,379.00 481.38,381.92 484.45,397.34 487.52,382.13 490.59,396.72 493.66,404.43 496.73,404.22 499.80,389.42 502.87,409.02 505.94,398.39 509.01,407.77 512.08,395.68 515.15,417.15 518.22,410.06 521.29,411.94 524.36,411.73 527.43,417.35 530.50,425.69 533.57,427.15 536.64,415.06 539.71,421.11 542.78,423.19 545.85,422.77 548.92,424.44 551.98,426.73 555.05,435.28 558.12,428.19 561.19,440.91 564.26,445.08 567.33,439.03 570.40,440.49 573.47,459.88 576.54,454.88 579.61,452.17 582.68,463.21 585.75,464.26 588.82,458.21 591.89,460.29 594.96,467.38 598.03,473.01 601.10,471.76 604.17,481.77 607.24,480.93 610.31,470.30 613.38,475.51 616.45,472.59 619.52,480.10 622.59,481.56 625.66,487.60 628.72,493.44 631.79,484.27 634.86,496.98 637.93,496.77 641.00,489.27 644.07,490.73 647.14,494.27 650.21,502.40 653.28,493.86 656.35,499.07 659.42,494.06 662.49,506.78 665.56,498.44 668.63,506.78 671.70,510.74 674.77,507.61 677.84,505.32 680.91,512.41 683.98,506.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,146.16 76.19,144.91 79.26,136.16 82.33,122.40 85.40,130.32 88.47,136.58 91.54,113.02 94.61,131.78 97.68,121.57 100.75,110.10 103.82,125.94 106.89,125.11 109.96,124.49 113.03,110.10 116.10,113.65 119.17,104.47 122.24,113.23 125.31,89.47 128.38,107.18 131.45,75.08 134.52,104.47 137.59,77.17 140.66,94.47 143.73,108.43 146.80,98.22 149.87,77.79 152.94,78.21 156.00,90.72 159.07,80.71 162.14,88.42 165.21,87.17 168.28,81.96 171.35,83.84 174.42,82.38 177.49,83.00 180.56,86.96 183.63,91.34 186.70,73.62 189.77,78.42 192.84,77.38 195.91,96.14 198.98,76.96 202.05,86.13 205.12,91.13 208.19,83.63 211.26,81.54 214.33,81.75 217.40,61.95 220.47,76.54 223.54,90.09 226.61,105.93 229.68,74.67 232.75,96.76 235.81,89.47 238.88,85.92 241.95,93.01 245.02,121.36 248.09,101.14 251.16,105.31 254.23,115.11 257.30,107.18 260.37,102.60 263.44,119.69 266.51,128.45 269.58,111.98 272.65,122.61 275.72,129.07 278.79,131.99 281.86,134.49 284.93,125.94 288.00,152.42 291.07,151.79 294.14,169.09 297.21,155.96 300.28,174.30 303.35,170.76 306.42,180.97 309.49,180.97 312.56,184.73 315.62,180.56 318.69,185.35 321.76,184.52 324.83,202.86 327.90,200.99 330.97,201.40 334.04,204.53 337.11,194.94 340.18,203.07 343.25,221.21 346.32,215.37 349.39,216.83 352.46,241.63 355.53,240.17 358.60,224.33 361.67,262.69 364.74,247.26 367.81,255.81 370.88,256.22 373.95,259.98 377.02,275.40 380.09,264.98 383.16,260.39 386.23,288.12 389.30,283.32 392.36,280.40 395.43,285.62 398.50,288.33 401.57,293.75 404.64,296.25 407.71,302.29 410.78,304.17 413.85,309.80 416.92,313.13 419.99,322.09 423.06,337.52 426.13,324.80 429.20,333.14 432.27,326.47 435.34,342.10 438.41,341.90 441.48,352.11 444.55,356.70 447.62,359.41 450.69,368.99 453.76,362.53 456.83,358.57 459.90,376.50 462.97,352.94 466.04,360.03 469.11,377.33 472.17,363.16 475.24,373.16 478.31,378.17 481.38,382.96 484.45,390.05 487.52,378.37 490.59,389.84 493.66,394.63 496.73,391.09 499.80,387.76 502.87,392.97 505.94,397.97 509.01,406.93 512.08,406.72 515.15,404.85 518.22,405.47 521.29,411.52 524.36,412.98 527.43,423.40 530.50,420.48 533.57,419.44 536.64,421.52 539.71,421.94 542.78,424.44 545.85,427.99 548.92,431.11 551.98,425.90 555.05,441.33 558.12,436.53 561.19,436.53 564.26,446.33 567.33,445.50 570.40,451.54 573.47,454.46 576.54,455.71 579.61,453.21 582.68,465.51 585.75,456.54 588.82,456.75 591.89,464.05 594.96,470.30 598.03,460.92 601.10,464.46 604.17,470.51 607.24,478.43 610.31,477.80 613.38,468.01 616.45,471.76 619.52,473.22 622.59,484.27 625.66,480.51 628.72,494.48 631.79,495.73 634.86,490.94 637.93,489.06 641.00,491.35 644.07,493.86 647.14,487.18 650.21,493.86 653.28,494.27 656.35,500.94 659.42,494.27 662.49,512.41 665.56,505.53 668.63,511.99 671.70,508.45 674.77,514.49 677.84,505.32 680.91,509.70 683.98,506.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,133.87 76.19,119.69 79.26,128.45 82.33,129.49 85.40,131.16 88.47,116.36 91.54,114.90 94.61,127.20 97.68,123.86 100.75,123.65 103.82,108.02 106.89,103.43 109.96,119.69 113.03,124.28 116.10,118.02 119.17,84.05 122.24,104.27 125.31,103.64 128.38,101.35 131.45,101.56 134.52,114.27 137.59,80.29 140.66,101.56 143.73,94.47 146.80,87.38 149.87,87.59 152.94,88.63 156.00,95.72 159.07,97.80 162.14,100.51 165.21,83.42 168.28,90.72 171.35,95.93 174.42,67.79 177.49,88.63 180.56,73.42 183.63,96.76 186.70,93.63 189.77,90.93 192.84,89.88 195.91,90.51 198.98,90.30 202.05,72.37 205.12,70.71 208.19,68.41 211.26,80.71 214.33,77.79 217.40,82.38 220.47,94.68 223.54,102.18 226.61,77.17 229.68,80.50 232.75,94.05 235.81,97.80 238.88,115.31 241.95,98.01 245.02,107.39 248.09,104.47 251.16,108.23 254.23,116.77 257.30,118.44 260.37,136.99 263.44,110.10 266.51,137.62 269.58,113.23 272.65,140.74 275.72,133.45 278.79,145.12 281.86,162.42 284.93,132.20 288.00,136.58 291.07,157.84 294.14,138.66 297.21,153.67 300.28,157.42 303.35,165.55 306.42,169.30 309.49,171.39 312.56,177.43 315.62,170.34 318.69,186.39 321.76,195.77 324.83,198.69 327.90,196.82 330.97,192.23 334.04,190.15 337.11,209.12 340.18,213.28 343.25,229.33 346.32,231.42 349.39,234.13 352.46,233.30 355.53,254.77 358.60,246.01 361.67,244.13 364.74,240.38 367.81,245.59 370.88,258.73 373.95,248.09 377.02,275.82 380.09,255.81 383.16,274.36 386.23,269.98 389.30,289.37 392.36,285.41 395.43,284.57 398.50,306.25 401.57,292.08 404.64,312.71 407.71,291.66 410.78,319.18 413.85,323.97 416.92,315.42 419.99,304.58 423.06,331.06 426.13,323.14 429.20,350.44 432.27,332.10 435.34,332.10 438.41,340.65 441.48,349.82 444.55,354.82 447.62,351.28 450.69,351.28 453.76,364.41 456.83,372.33 459.90,362.95 462.97,375.87 466.04,366.70 469.11,368.99 472.17,366.08 475.24,370.45 478.31,380.67 481.38,377.54 484.45,382.54 487.52,386.92 490.59,394.63 493.66,406.10 496.73,394.01 499.80,396.51 502.87,403.60 505.94,408.81 509.01,404.01 512.08,393.38 515.15,398.80 518.22,414.64 521.29,403.81 524.36,411.94 527.43,414.44 530.50,424.65 533.57,423.61 536.64,418.19 539.71,417.35 542.78,427.15 545.85,434.45 548.92,439.45 551.98,438.62 555.05,433.41 558.12,445.91 561.19,440.28 564.26,450.29 567.33,463.84 570.40,446.33 573.47,453.21 576.54,446.33 579.61,456.33 582.68,454.04 585.75,456.96 588.82,461.75 591.89,466.34 594.96,458.84 598.03,473.01 601.10,475.93 604.17,467.80 607.24,466.76 610.31,474.89 613.38,478.43 616.45,477.60 619.52,480.51 622.59,482.81 625.66,482.18 628.72,485.31 631.79,481.35 634.86,480.93 637.93,488.02 641.00,494.90 644.07,479.68 647.14,492.19 650.21,494.69 653.28,501.98 656.35,509.70 659.42,495.73 662.49,501.78 665.56,498.86 668.63,511.78 671.70,510.74 674.77,503.86 677.84,512.20 680.91,510.53 683.98,517.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,129.28 76.19,115.11 79.26,124.28 82.33,113.44 85.40,119.69 88.47,118.86 91.54,117.40 94.61,111.98 97.68,130.53 100.75,102.60 103.82,104.47 106.89,120.94 109.96,114.06 113.03,114.69 116.10,109.48 119.17,102.60 122.24,97.18 125.31,109.27 128.38,105.10 131.45,121.15 134.52,104.27 137.59,86.96 140.66,102.60 143.73,96.97 146.80,104.06 149.87,97.80 152.94,106.56 156.00,90.93 159.07,92.80 162.14,100.72 165.21,95.51 168.28,83.21 171.35,78.84 174.42,76.13 177.49,93.01 180.56,72.37 183.63,73.21 186.70,72.37 189.77,91.34 192.84,78.84 195.91,74.67 198.98,80.09 202.05,89.05 205.12,71.96 208.19,85.09 211.26,61.95 214.33,99.47 217.40,76.96 220.47,74.67 223.54,105.31 226.61,92.59 229.68,93.01 232.75,99.26 235.81,108.02 238.88,99.05 241.95,107.81 245.02,119.48 248.09,124.28 251.16,98.43 254.23,93.22 257.30,109.06 260.37,117.61 263.44,101.14 266.51,112.81 269.58,109.27 272.65,137.62 275.72,133.24 278.79,125.11 281.86,121.57 284.93,151.17 288.00,145.33 291.07,163.47 294.14,150.12 297.21,158.67 300.28,162.84 303.35,184.31 306.42,160.34 309.49,174.72 312.56,175.97 315.62,176.60 318.69,188.69 321.76,185.14 324.83,189.31 327.90,191.19 330.97,201.82 334.04,207.03 337.11,228.08 340.18,215.79 343.25,231.21 346.32,211.20 349.39,217.45 352.46,227.04 355.53,231.00 358.60,231.21 361.67,249.14 364.74,251.64 367.81,245.39 370.88,261.02 373.95,257.89 377.02,264.56 380.09,266.02 383.16,260.60 386.23,286.03 389.30,273.53 392.36,291.45 395.43,296.87 398.50,289.78 401.57,283.53 404.64,304.79 407.71,306.88 410.78,320.22 413.85,314.59 416.92,311.67 419.99,312.30 423.06,320.01 426.13,332.72 429.20,325.43 432.27,337.10 435.34,342.94 438.41,339.19 441.48,346.27 444.55,343.98 447.62,350.65 450.69,360.24 453.76,357.11 456.83,363.16 459.90,368.99 462.97,374.41 466.04,368.37 469.11,374.21 472.17,366.70 475.24,371.08 478.31,366.70 481.38,377.54 484.45,394.43 487.52,386.30 490.59,380.04 493.66,392.55 496.73,394.63 499.80,411.31 502.87,388.38 505.94,404.01 509.01,411.73 512.08,406.93 515.15,406.31 518.22,402.55 521.29,418.81 524.36,415.48 527.43,412.98 530.50,414.02 533.57,424.44 536.64,419.02 539.71,422.77 542.78,425.28 545.85,424.23 548.92,427.57 551.98,427.78 555.05,428.82 558.12,442.16 561.19,445.50 564.26,450.08 567.33,446.75 570.40,445.29 573.47,446.33 576.54,458.00 579.61,459.25 582.68,454.67 585.75,450.50 588.82,460.29 591.89,460.09 594.96,473.43 598.03,474.26 601.10,460.50 604.17,466.34 607.24,473.64 610.31,470.72 613.38,475.09 616.45,474.47 619.52,478.01 622.59,490.31 625.66,484.06 628.72,481.35 631.79,482.60 634.86,483.22 637.93,483.02 641.00,497.61 644.07,496.15 647.14,496.15 650.21,494.69 653.28,494.06 656.35,491.15 659.42,504.28 662.49,502.19 665.56,506.78 668.63,497.19 671.70,505.53 674.77,506.99 677.84,509.91 680.91,511.16 683.98,514.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,115.52 76.19,138.24 79.26,146.79 82.33,113.44 85.40,131.99 88.47,111.98 91.54,127.82 94.61,99.68 97.68,127.61 100.75,121.98 103.82,92.80 106.89,107.39 109.96,103.02 113.03,109.48 116.10,98.43 119.17,106.98 122.24,102.39 125.31,114.69 128.38,116.15 131.45,106.56 134.52,105.93 137.59,95.51 140.66,79.67 143.73,102.81 146.80,102.39 149.87,68.83 152.94,93.22 156.00,91.76 159.07,86.96 162.14,89.88 165.21,76.75 168.28,78.63 171.35,71.33 174.42,81.75 177.49,86.34 180.56,66.75 183.63,72.79 186.70,70.29 189.77,76.33 192.84,95.72 195.91,82.80 198.98,77.17 202.05,77.38 205.12,91.34 208.19,88.63 211.26,58.41 214.33,100.93 217.40,74.87 220.47,79.46 223.54,89.26 226.61,62.58 229.68,101.76 232.75,90.09 235.81,105.72 238.88,92.59 241.95,107.60 245.02,103.64 248.09,123.65 251.16,118.44 254.23,100.31 257.30,122.82 260.37,108.85 263.44,128.03 266.51,131.36 269.58,122.82 272.65,130.74 275.72,139.29 278.79,129.28 281.86,99.47 284.93,127.20 288.00,143.25 291.07,159.71 294.14,142.41 297.21,170.55 300.28,172.01 303.35,170.97 306.42,177.85 309.49,164.72 312.56,168.05 315.62,178.89 318.69,195.15 321.76,191.61 324.83,203.07 327.90,189.73 330.97,194.11 334.04,200.99 337.11,219.12 340.18,203.28 343.25,228.71 346.32,217.45 349.39,237.67 352.46,232.46 355.53,214.95 358.60,243.30 361.67,240.38 364.74,248.51 367.81,246.64 370.88,248.72 373.95,242.47 377.02,272.48 380.09,270.61 383.16,263.10 386.23,286.24 389.30,263.94 392.36,291.24 395.43,270.82 398.50,286.03 401.57,290.20 404.64,305.63 407.71,294.79 410.78,309.80 413.85,311.05 416.92,320.22 419.99,323.76 423.06,333.98 426.13,319.18 429.20,337.73 432.27,324.39 435.34,346.48 438.41,346.69 441.48,335.64 444.55,347.52 447.62,362.74 450.69,352.32 453.76,338.35 456.83,362.74 459.90,362.74 462.97,366.91 466.04,375.67 469.11,373.79 472.17,376.29 475.24,378.17 478.31,366.91 481.38,392.97 484.45,386.92 487.52,392.97 490.59,395.88 493.66,388.59 496.73,390.05 499.80,399.64 502.87,390.26 505.94,397.55 509.01,405.06 512.08,408.60 515.15,415.90 518.22,408.39 521.29,418.61 524.36,413.39 527.43,412.77 530.50,420.69 533.57,416.52 536.64,427.15 539.71,428.19 542.78,427.78 545.85,432.57 548.92,415.27 551.98,428.19 555.05,432.99 558.12,432.57 561.19,440.08 564.26,447.79 567.33,449.87 570.40,450.50 573.47,437.57 576.54,456.13 579.61,453.62 582.68,454.46 585.75,453.83 588.82,456.54 591.89,466.97 594.96,466.76 598.03,474.47 601.10,466.97 604.17,476.97 607.24,464.67 610.31,467.59 613.38,471.34 616.45,473.64 619.52,485.31 622.59,478.22 625.66,478.01 628.72,480.72 631.79,480.51 634.86,476.97 637.93,490.94 641.00,487.81 644.07,490.52 647.14,485.31 650.21,488.02 653.28,494.27 656.35,503.24 659.42,489.27 662.49,503.24 665.56,499.27 668.63,508.45 671.70,499.48 674.77,508.03 677.84,510.53 680.91,513.66 683.98,511.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,137.62 76.19,137.83 79.26,126.15 82.33,139.91 85.40,113.23 88.47,137.83 91.54,118.23 94.61,109.89 97.68,139.49 100.75,112.19 103.82,101.14 106.89,115.31 109.96,111.35 113.03,100.10 116.10,99.05 119.17,79.46 122.24,85.71 125.31,118.02 128.38,106.14 131.45,107.18 134.52,113.85 137.59,99.05 140.66,124.28 143.73,86.55 146.80,111.14 149.87,97.39 152.94,97.60 156.00,79.46 159.07,70.91 162.14,73.21 165.21,74.46 168.28,89.05 171.35,55.70 174.42,81.96 177.49,85.09 180.56,96.97 183.63,86.34 186.70,90.30 189.77,76.75 192.84,89.47 195.91,82.59 198.98,98.64 202.05,82.38 205.12,82.80 208.19,76.75 211.26,81.34 214.33,76.96 217.40,87.80 220.47,85.30 223.54,84.67 226.61,80.50 229.68,103.43 232.75,81.34 235.81,86.13 238.88,91.97 241.95,90.72 245.02,94.68 248.09,93.84 251.16,110.10 254.23,93.22 257.30,88.22 260.37,128.03 263.44,123.03 266.51,130.53 269.58,108.02 272.65,128.03 275.72,121.78 278.79,121.15 281.86,138.66 284.93,115.31 288.00,139.29 291.07,146.79 294.14,156.17 297.21,170.55 300.28,161.59 303.35,160.13 306.42,183.68 309.49,176.18 312.56,185.56 315.62,186.81 318.69,174.51 321.76,182.43 324.83,192.02 327.90,199.11 330.97,193.69 334.04,216.62 337.11,220.58 340.18,214.95 343.25,202.86 346.32,224.54 349.39,217.87 352.46,225.17 355.53,225.17 358.60,222.46 361.67,247.89 364.74,257.48 367.81,263.10 370.88,264.15 373.95,259.77 377.02,269.98 380.09,249.76 383.16,268.31 386.23,269.98 389.30,265.19 392.36,287.49 395.43,289.16 398.50,278.11 401.57,287.49 404.64,301.67 407.71,291.24 410.78,288.12 413.85,300.62 416.92,308.75 419.99,328.76 423.06,322.93 426.13,318.13 429.20,323.34 432.27,332.31 435.34,339.19 438.41,339.81 441.48,343.56 444.55,351.49 447.62,338.56 450.69,348.78 453.76,357.32 456.83,367.95 459.90,362.74 462.97,369.83 466.04,355.86 469.11,374.83 472.17,370.25 475.24,377.96 478.31,373.58 481.38,389.63 484.45,372.96 487.52,374.00 490.59,382.96 493.66,382.34 496.73,405.26 499.80,385.25 502.87,393.17 505.94,402.76 509.01,412.14 512.08,406.10 515.15,406.31 518.22,414.85 521.29,409.43 524.36,418.81 527.43,421.73 530.50,419.23 533.57,425.48 536.64,425.69 539.71,421.94 542.78,415.48 545.85,419.23 548.92,437.99 551.98,433.61 555.05,434.03 558.12,435.91 561.19,447.16 564.26,442.99 567.33,447.79 570.40,439.87 573.47,449.87 576.54,441.74 579.61,445.29 582.68,459.04 585.75,448.41 588.82,448.20 591.89,460.09 594.96,460.92 598.03,457.17 601.10,463.63 604.17,469.26 607.24,462.80 610.31,470.51 613.38,471.55 616.45,476.55 619.52,467.17 622.59,478.43 625.66,490.10 628.72,488.64 631.79,491.15 634.86,491.56 637.93,494.27 641.00,486.35 644.07,496.15 647.14,493.44 650.21,498.23 653.28,493.65 656.35,494.48 659.42,500.53 662.49,498.02 665.56,503.24 668.63,503.65 671.70,512.82 674.77,508.86 677.84,511.99 680.91,508.86 683.98,500.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,144.08 76.19,127.61 79.26,133.24 82.33,116.15 85.40,122.40 88.47,116.36 91.54,130.53 94.61,125.53 97.68,114.90 100.75,137.83 103.82,132.82 106.89,106.14 109.96,117.19 113.03,87.59 116.10,109.27 119.17,96.97 122.24,108.23 125.31,87.59 128.38,102.81 131.45,109.06 134.52,90.51 137.59,102.18 140.66,94.05 143.73,90.72 146.80,97.18 149.87,72.79 152.94,99.05 156.00,78.42 159.07,101.97 162.14,62.58 165.21,67.79 168.28,92.38 171.35,68.00 174.42,87.80 177.49,84.25 180.56,87.17 183.63,77.58 186.70,81.13 189.77,72.79 192.84,76.13 195.91,88.22 198.98,78.00 202.05,80.09 205.12,85.51 208.19,78.21 211.26,82.17 214.33,86.76 217.40,94.68 220.47,111.98 223.54,82.80 226.61,81.75 229.68,98.64 232.75,90.51 235.81,93.43 238.88,93.43 241.95,83.00 245.02,102.39 248.09,91.55 251.16,106.35 254.23,105.10 257.30,106.77 260.37,120.52 263.44,113.02 266.51,135.32 269.58,120.52 272.65,129.70 275.72,136.58 278.79,147.41 281.86,129.07 284.93,140.33 288.00,155.13 291.07,168.47 294.14,156.79 297.21,173.26 300.28,163.67 303.35,177.22 306.42,165.76 309.49,170.34 312.56,175.76 315.62,171.18 318.69,181.81 321.76,178.89 324.83,201.19 327.90,187.44 330.97,210.57 334.04,203.28 337.11,209.95 340.18,227.46 343.25,214.12 346.32,231.63 349.39,234.34 352.46,239.34 355.53,242.88 358.60,238.51 361.67,246.43 364.74,241.01 367.81,248.72 370.88,252.06 373.95,256.64 377.02,262.69 380.09,256.43 383.16,268.11 386.23,269.15 389.30,282.70 392.36,283.11 395.43,288.33 398.50,303.33 401.57,311.88 404.64,292.91 407.71,302.50 410.78,315.22 413.85,316.26 416.92,328.76 419.99,335.85 423.06,324.18 426.13,333.56 429.20,326.26 432.27,343.98 435.34,338.56 438.41,347.94 441.48,352.53 444.55,334.60 447.62,348.98 450.69,353.99 453.76,370.87 456.83,365.24 459.90,355.65 462.97,365.87 466.04,361.70 469.11,368.16 472.17,374.83 475.24,374.21 478.31,383.59 481.38,371.50 484.45,385.88 487.52,387.76 490.59,379.42 493.66,384.42 496.73,390.26 499.80,396.93 502.87,397.76 505.94,394.63 509.01,407.35 512.08,409.02 515.15,411.31 518.22,402.14 521.29,410.68 524.36,417.56 527.43,418.81 530.50,430.49 533.57,422.15 536.64,418.19 539.71,420.06 542.78,426.32 545.85,431.11 548.92,433.82 551.98,431.95 555.05,448.00 558.12,440.70 561.19,442.16 564.26,447.58 567.33,448.83 570.40,441.12 573.47,448.20 576.54,451.12 579.61,460.29 582.68,448.00 585.75,463.21 588.82,464.05 591.89,461.96 594.96,466.13 598.03,473.22 601.10,477.80 604.17,465.92 607.24,473.22 610.31,480.72 613.38,478.01 616.45,475.51 619.52,476.35 622.59,484.68 625.66,491.35 628.72,484.47 631.79,481.56 634.86,481.77 637.93,483.02 641.00,492.40 644.07,501.36 647.14,493.23 650.21,506.36 653.28,496.15 656.35,490.73 659.42,499.48 662.49,501.36 665.56,498.65 668.63,505.53 671.70,501.57 674.77,506.99 677.84,513.87 680.91,506.57 683.98,513.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,135.53 76.19,114.06 79.26,135.74 82.33,124.28 85.40,107.18 88.47,98.22 91.54,112.19 94.61,123.23 97.68,113.85 100.75,113.02 103.82,100.93 106.89,120.73 109.96,111.77 113.03,116.77 116.10,104.06 119.17,104.68 122.24,104.47 125.31,101.97 128.38,110.73 131.45,104.89 134.52,94.68 137.59,109.06 140.66,100.72 143.73,87.80 146.80,81.96 149.87,75.08 152.94,79.04 156.00,108.85 159.07,90.30 162.14,68.62 165.21,83.21 168.28,101.76 171.35,101.76 174.42,78.00 177.49,71.12 180.56,70.29 183.63,65.91 186.70,88.22 189.77,87.59 192.84,69.04 195.91,83.84 198.98,83.42 202.05,87.59 205.12,77.58 208.19,77.17 211.26,88.84 214.33,66.54 217.40,99.68 220.47,84.46 223.54,93.63 226.61,108.23 229.68,87.80 232.75,96.97 235.81,111.35 238.88,100.10 241.95,101.14 245.02,118.86 248.09,114.69 251.16,94.89 254.23,124.28 257.30,118.86 260.37,125.32 263.44,134.49 266.51,135.53 269.58,130.11 272.65,111.98 275.72,119.07 278.79,131.78 281.86,141.99 284.93,136.78 288.00,149.71 291.07,143.04 294.14,151.38 297.21,149.71 300.28,165.34 303.35,177.01 306.42,158.67 309.49,177.85 312.56,171.80 315.62,189.10 318.69,161.38 321.76,189.10 324.83,204.53 327.90,200.15 330.97,197.23 334.04,199.11 337.11,210.99 340.18,209.74 343.25,209.95 346.32,218.70 349.39,222.87 352.46,234.13 355.53,231.84 358.60,232.67 361.67,247.89 364.74,252.26 367.81,250.39 370.88,262.27 373.95,261.02 377.02,248.51 380.09,257.27 383.16,266.23 386.23,272.07 389.30,265.19 392.36,272.69 395.43,305.63 398.50,293.33 401.57,304.38 404.64,293.95 407.71,292.29 410.78,308.34 413.85,315.01 416.92,321.68 419.99,307.29 423.06,312.71 426.13,332.72 429.20,315.84 432.27,329.60 435.34,335.64 438.41,334.18 441.48,346.27 444.55,347.11 447.62,364.62 450.69,363.58 453.76,341.69 456.83,367.95 459.90,346.69 462.97,374.00 466.04,365.03 469.11,365.87 472.17,362.95 475.24,383.59 478.31,374.41 481.38,376.29 484.45,375.46 487.52,376.08 490.59,396.09 493.66,391.51 496.73,388.17 499.80,397.76 502.87,394.22 505.94,406.52 509.01,407.35 512.08,403.60 515.15,414.23 518.22,399.64 521.29,416.10 524.36,429.86 527.43,409.23 530.50,420.48 533.57,421.32 536.64,422.77 539.71,421.94 542.78,434.45 545.85,435.91 548.92,433.82 551.98,446.75 555.05,439.45 558.12,450.08 561.19,439.87 564.26,435.49 567.33,447.37 570.40,448.00 573.47,456.33 576.54,453.00 579.61,454.04 582.68,460.29 585.75,459.67 588.82,468.63 591.89,465.71 594.96,466.97 598.03,475.09 601.10,474.89 604.17,473.01 607.24,471.55 610.31,477.18 613.38,473.01 616.45,483.02 619.52,482.39 622.59,480.93 625.66,481.77 628.72,480.72 631.79,487.60 634.86,491.98 637.93,490.52 641.00,487.18 644.07,487.18 647.14,488.44 650.21,496.56 653.28,492.40 656.35,492.60 659.42,501.57 662.49,499.27 665.56,499.27 668.63,498.86 671.70,513.03 674.77,516.16 677.84,514.49 680.91,503.03 683.98,515.53 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,146.37 76.19,135.32 79.26,125.74 82.33,106.35 85.40,128.86 88.47,120.32 91.54,115.94 94.61,118.65 97.68,97.80 100.75,112.81 103.82,108.02 106.89,105.31 109.96,126.36 113.03,105.52 116.10,117.61 119.17,104.47 122.24,100.72 125.31,114.06 128.38,78.21 131.45,96.34 134.52,81.96 137.59,92.18 140.66,109.48 143.73,111.14 146.80,101.14 149.87,98.64 152.94,97.39 156.00,101.56 159.07,98.64 162.14,92.59 165.21,86.76 168.28,76.54 171.35,85.09 174.42,97.60 177.49,101.35 180.56,91.97 183.63,77.17 186.70,79.67 189.77,82.17 192.84,82.80 195.91,82.17 198.98,95.09 202.05,98.22 205.12,74.04 208.19,75.50 211.26,93.84 214.33,67.79 217.40,87.38 220.47,76.96 223.54,87.38 226.61,103.02 229.68,87.38 232.75,91.97 235.81,103.64 238.88,91.55 241.95,109.89 245.02,93.22 248.09,104.89 251.16,109.48 254.23,109.69 257.30,92.80 260.37,130.95 263.44,118.65 266.51,146.37 269.58,128.45 272.65,123.44 275.72,131.78 278.79,130.11 281.86,145.75 284.93,131.36 288.00,159.50 291.07,135.74 294.14,145.75 297.21,162.42 300.28,174.30 303.35,165.13 306.42,160.55 309.49,171.80 312.56,184.94 315.62,193.06 318.69,187.85 321.76,187.64 324.83,213.28 327.90,202.44 330.97,207.45 334.04,202.86 337.11,211.62 340.18,230.38 343.25,218.91 346.32,233.30 349.39,218.29 352.46,227.88 355.53,242.47 358.60,228.71 361.67,238.30 364.74,245.59 367.81,240.80 370.88,251.85 373.95,256.85 377.02,244.55 380.09,271.23 383.16,276.86 386.23,263.10 389.30,261.64 392.36,289.37 395.43,289.58 398.50,281.66 401.57,287.28 404.64,296.04 407.71,296.66 410.78,313.96 413.85,309.59 416.92,318.76 419.99,302.08 423.06,308.75 426.13,335.02 429.20,322.30 432.27,337.73 435.34,336.69 438.41,337.31 441.48,346.27 444.55,364.20 447.62,346.90 450.69,348.78 453.76,367.12 456.83,350.86 459.90,357.32 462.97,368.37 466.04,372.33 469.11,366.49 472.17,381.92 475.24,377.54 478.31,383.79 481.38,375.25 484.45,383.79 487.52,391.09 490.59,399.43 493.66,399.01 496.73,390.26 499.80,391.92 502.87,390.26 505.94,404.64 509.01,412.77 512.08,407.56 515.15,406.31 518.22,413.39 521.29,411.94 524.36,422.77 527.43,411.31 530.50,422.77 533.57,418.19 536.64,415.48 539.71,431.32 542.78,416.31 545.85,439.45 548.92,428.82 551.98,429.44 555.05,444.66 558.12,442.99 561.19,448.20 564.26,427.78 567.33,447.37 570.40,453.83 573.47,452.17 576.54,456.33 579.61,444.24 582.68,464.26 585.75,464.46 588.82,458.84 591.89,473.22 594.96,458.42 598.03,465.51 601.10,471.76 604.17,470.09 607.24,478.22 610.31,481.77 613.38,469.88 616.45,476.97 619.52,476.35 622.59,485.52 625.66,475.30 628.72,480.72 631.79,487.60 634.86,491.56 637.93,491.98 641.00,485.93 644.07,490.31 647.14,501.57 650.21,494.06 653.28,498.44 656.35,504.49 659.42,503.65 662.49,505.53 665.56,502.40 668.63,503.24 671.70,499.07 674.77,500.73 677.84,514.49 680.91,513.24 683.98,513.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,136.37 76.19,98.01 79.26,108.85 82.33,116.56 85.40,108.43 88.47,131.16 91.54,129.28 94.61,110.73 97.68,124.28 100.75,101.97 103.82,108.85 106.89,121.78 109.96,120.32 113.03,106.56 116.10,114.48 119.17,112.19 122.24,120.73 125.31,114.06 128.38,130.74 131.45,118.44 134.52,84.88 137.59,97.60 140.66,106.14 143.73,103.85 146.80,110.31 149.87,96.97 152.94,104.06 156.00,73.62 159.07,99.89 162.14,82.59 165.21,70.29 168.28,83.00 171.35,79.46 174.42,85.51 177.49,90.51 180.56,94.89 183.63,62.78 186.70,82.38 189.77,68.83 192.84,90.09 195.91,89.67 198.98,74.87 202.05,88.01 205.12,87.38 208.19,88.01 211.26,98.43 214.33,82.59 217.40,74.87 220.47,103.64 223.54,110.94 226.61,103.85 229.68,91.97 232.75,94.05 235.81,90.09 238.88,96.76 241.95,95.09 245.02,99.68 248.09,117.40 251.16,107.60 254.23,108.85 257.30,116.56 260.37,101.76 263.44,118.23 266.51,116.15 269.58,127.61 272.65,115.73 275.72,144.08 278.79,131.57 281.86,135.74 284.93,126.15 288.00,152.63 291.07,138.03 294.14,143.25 297.21,155.54 300.28,166.38 303.35,179.72 306.42,162.63 309.49,174.51 312.56,172.43 315.62,174.93 318.69,177.01 321.76,200.57 324.83,190.77 327.90,199.32 330.97,178.26 334.04,206.41 337.11,199.11 340.18,217.66 343.25,223.29 346.32,225.17 349.39,240.59 352.46,229.54 355.53,252.68 358.60,249.14 361.67,247.89 364.74,236.42 367.81,256.22 370.88,253.31 373.95,261.23 377.02,269.15 380.09,278.53 383.16,269.15 386.23,277.49 389.30,269.15 392.36,296.87 395.43,295.41 398.50,291.87 401.57,294.37 404.64,280.61 407.71,312.09 410.78,307.92 413.85,312.09 416.92,318.13 419.99,326.05 423.06,327.72 426.13,326.89 429.20,333.56 432.27,340.85 435.34,350.44 438.41,342.94 441.48,337.52 444.55,351.90 447.62,350.03 450.69,359.41 453.76,357.95 456.83,355.86 459.90,351.49 462.97,361.28 466.04,378.79 469.11,371.50 472.17,368.58 475.24,373.79 478.31,388.38 481.38,378.17 484.45,378.79 487.52,391.09 490.59,387.76 493.66,395.68 496.73,389.01 499.80,396.51 502.87,397.97 505.94,397.76 509.01,403.39 512.08,400.89 515.15,409.23 518.22,412.14 521.29,422.98 524.36,417.56 527.43,412.14 530.50,415.27 533.57,434.86 536.64,423.82 539.71,429.86 542.78,432.57 545.85,424.65 548.92,440.28 551.98,429.44 555.05,438.62 558.12,433.41 561.19,442.99 564.26,448.62 567.33,446.12 570.40,441.74 573.47,437.99 576.54,453.21 579.61,452.58 582.68,451.96 585.75,461.34 588.82,458.00 591.89,455.50 594.96,476.76 598.03,470.72 601.10,474.05 604.17,469.26 607.24,473.01 610.31,473.22 613.38,477.39 616.45,475.93 619.52,486.98 622.59,484.47 625.66,483.43 628.72,480.31 631.79,480.93 634.86,482.81 637.93,492.40 641.00,491.35 644.07,494.69 647.14,494.06 650.21,492.81 653.28,490.94 656.35,504.49 659.42,492.40 662.49,511.57 665.56,496.36 668.63,508.03 671.70,506.57 674.77,506.15 677.84,501.36 680.91,502.40 683.98,513.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,125.74 76.19,132.41 79.26,125.53 82.33,125.11 85.40,126.99 88.47,123.03 91.54,123.03 94.61,127.82 97.68,113.85 100.75,101.35 103.82,107.81 106.89,98.85 109.96,94.05 113.03,76.54 116.10,106.77 119.17,112.60 122.24,95.30 125.31,109.89 128.38,110.94 131.45,98.64 134.52,105.52 137.59,101.35 140.66,84.67 143.73,98.64 146.80,115.73 149.87,109.89 152.94,105.93 156.00,102.81 159.07,87.59 162.14,105.93 165.21,83.84 168.28,96.97 171.35,68.00 174.42,73.21 177.49,73.21 180.56,89.05 183.63,92.38 186.70,78.42 189.77,69.87 192.84,94.68 195.91,89.26 198.98,80.92 202.05,102.81 205.12,76.33 208.19,99.68 211.26,95.09 214.33,91.76 217.40,101.35 220.47,83.21 223.54,116.98 226.61,112.81 229.68,86.13 232.75,98.85 235.81,97.60 238.88,103.02 241.95,106.98 245.02,116.98 248.09,111.56 251.16,118.65 254.23,102.60 257.30,106.14 260.37,119.07 263.44,114.69 266.51,118.44 269.58,128.45 272.65,137.20 275.72,151.79 278.79,129.07 281.86,142.41 284.93,158.05 288.00,144.70 291.07,143.04 294.14,145.33 297.21,161.59 300.28,150.54 303.35,169.93 306.42,177.01 309.49,182.23 312.56,181.39 315.62,191.40 318.69,186.19 321.76,187.44 324.83,185.98 327.90,209.74 330.97,208.28 334.04,217.66 337.11,216.41 340.18,217.04 343.25,231.21 346.32,233.92 349.39,239.13 352.46,236.00 355.53,236.42 358.60,238.09 361.67,236.00 364.74,246.84 367.81,246.43 370.88,244.34 373.95,266.65 377.02,271.86 380.09,274.78 383.16,273.32 386.23,267.06 389.30,277.07 392.36,286.24 395.43,297.08 398.50,279.36 401.57,300.00 404.64,299.79 407.71,290.62 410.78,305.63 413.85,303.13 416.92,307.29 419.99,331.06 423.06,323.34 426.13,331.27 429.20,329.81 432.27,328.56 435.34,339.60 438.41,344.61 441.48,338.35 444.55,349.61 447.62,343.36 450.69,358.99 453.76,353.78 456.83,374.00 459.90,367.54 462.97,373.58 466.04,367.95 469.11,372.12 472.17,371.91 475.24,373.16 478.31,377.96 481.38,378.37 484.45,382.34 487.52,379.63 490.59,396.30 493.66,389.42 496.73,387.55 499.80,399.01 502.87,399.01 505.94,386.30 509.01,402.97 512.08,408.60 515.15,408.39 518.22,400.26 521.29,415.06 524.36,421.73 527.43,408.39 530.50,416.73 533.57,419.23 536.64,420.48 539.71,423.19 542.78,429.24 545.85,431.74 548.92,430.28 551.98,437.16 555.05,445.50 558.12,446.54 561.19,435.49 564.26,431.74 567.33,446.33 570.40,445.50 573.47,436.53 576.54,451.33 579.61,450.08 582.68,461.96 585.75,458.63 588.82,466.97 591.89,452.17 594.96,464.46 598.03,467.59 601.10,477.39 604.17,465.71 607.24,470.72 610.31,472.38 613.38,477.80 616.45,469.47 619.52,484.27 622.59,485.52 625.66,487.18 628.72,476.55 631.79,489.27 634.86,489.69 637.93,497.82 641.00,493.02 644.07,494.90 647.14,491.77 650.21,498.44 653.28,495.52 656.35,502.40 659.42,500.11 662.49,506.36 665.56,491.56 668.63,508.86 671.70,512.41 674.77,504.28 677.84,509.49 680.91,511.36 683.98,515.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,137.20 76.19,134.07 79.26,117.61 82.33,121.15 85.40,114.69 88.47,117.40 91.54,104.06 94.61,133.66 97.68,113.44 100.75,99.68 103.82,101.35 106.89,108.02 109.96,95.93 113.03,110.10 116.10,114.90 119.17,80.71 122.24,97.80 125.31,107.18 128.38,94.26 131.45,113.65 134.52,101.14 137.59,94.68 140.66,105.10 143.73,79.46 146.80,93.63 149.87,89.05 152.94,89.88 156.00,97.39 159.07,91.97 162.14,83.21 165.21,72.58 168.28,88.22 171.35,95.30 174.42,91.34 177.49,57.16 180.56,74.67 183.63,86.76 186.70,81.34 189.77,79.04 192.84,95.30 195.91,70.29 198.98,74.04 202.05,88.84 205.12,86.13 208.19,90.72 211.26,79.46 214.33,88.22 217.40,96.97 220.47,82.17 223.54,108.23 226.61,93.63 229.68,92.18 232.75,79.46 235.81,106.98 238.88,90.30 241.95,95.09 245.02,102.39 248.09,103.02 251.16,112.81 254.23,120.11 257.30,129.49 260.37,123.65 263.44,112.19 266.51,144.50 269.58,106.77 272.65,134.70 275.72,124.49 278.79,130.74 281.86,133.03 284.93,130.11 288.00,135.32 291.07,151.17 294.14,152.21 297.21,132.20 300.28,153.67 303.35,173.05 306.42,169.93 309.49,167.43 312.56,177.01 315.62,168.68 318.69,174.51 321.76,185.77 324.83,181.39 327.90,190.35 330.97,214.33 334.04,213.08 337.11,213.70 340.18,220.58 343.25,218.50 346.32,208.07 349.39,227.88 352.46,248.51 355.53,228.29 358.60,247.89 361.67,246.64 364.74,247.05 367.81,244.97 370.88,265.60 373.95,235.38 377.02,254.97 380.09,255.60 383.16,270.82 386.23,279.78 389.30,268.73 392.36,284.57 395.43,281.66 398.50,274.78 401.57,295.00 404.64,295.62 407.71,310.42 410.78,302.08 413.85,311.67 416.92,317.72 419.99,312.92 423.06,316.88 426.13,318.34 429.20,341.48 432.27,342.52 435.34,351.07 438.41,352.53 441.48,340.85 444.55,343.98 447.62,358.78 450.69,354.82 453.76,363.58 456.83,353.78 459.90,358.57 462.97,361.91 466.04,375.25 469.11,385.05 472.17,365.87 475.24,370.66 478.31,381.71 481.38,377.54 484.45,376.50 487.52,391.92 490.59,383.79 493.66,401.93 496.73,385.25 499.80,388.80 502.87,401.10 505.94,392.76 509.01,406.52 512.08,405.26 515.15,406.52 518.22,404.43 521.29,401.51 524.36,410.68 527.43,411.10 530.50,420.27 533.57,431.32 536.64,421.32 539.71,432.99 542.78,424.44 545.85,424.23 548.92,430.90 551.98,433.82 555.05,435.28 558.12,436.95 561.19,435.49 564.26,449.66 567.33,451.12 570.40,439.87 573.47,435.70 576.54,446.95 579.61,449.46 582.68,462.38 585.75,453.62 588.82,450.71 591.89,456.96 594.96,458.42 598.03,469.68 601.10,468.42 604.17,472.59 607.24,473.84 610.31,474.47 613.38,469.47 616.45,477.80 619.52,474.89 622.59,473.43 625.66,479.47 628.72,475.09 631.79,494.69 634.86,488.44 637.93,487.81 641.00,491.35 644.07,489.89 647.14,490.52 650.21,496.56 653.28,503.86 656.35,498.44 659.42,503.65 662.49,503.03 665.56,500.11 668.63,500.73 671.70,505.53 674.77,514.07 677.84,509.91 680.91,507.82 683.98,510.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,138.24 76.19,135.95 79.26,122.61 82.33,91.34 85.40,131.99 88.47,140.74 91.54,119.69 94.61,131.57 97.68,110.94 100.75,117.81 103.82,87.80 106.89,108.02 109.96,112.19 113.03,99.89 116.10,88.22 119.17,103.43 122.24,112.19 125.31,103.85 128.38,104.27 131.45,95.51 134.52,107.18 137.59,108.43 140.66,98.64 143.73,85.09 146.80,82.38 149.87,88.63 152.94,90.93 156.00,93.43 159.07,91.13 162.14,98.64 165.21,105.52 168.28,99.05 171.35,90.72 174.42,101.56 177.49,72.58 180.56,87.38 183.63,96.34 186.70,85.09 189.77,72.37 192.84,92.18 195.91,76.54 198.98,77.58 202.05,83.84 205.12,80.09 208.19,62.78 211.26,98.22 214.33,97.18 217.40,83.84 220.47,91.76 223.54,77.38 226.61,89.05 229.68,110.10 232.75,85.71 235.81,90.93 238.88,89.05 241.95,107.39 245.02,106.14 248.09,98.43 251.16,112.60 254.23,102.81 257.30,115.52 260.37,120.94 263.44,124.07 266.51,139.08 269.58,135.74 272.65,125.32 275.72,130.32 278.79,127.61 281.86,138.24 284.93,125.53 288.00,129.70 291.07,146.16 294.14,145.33 297.21,159.09 300.28,179.72 303.35,184.10 306.42,169.30 309.49,181.39 312.56,186.60 315.62,183.27 318.69,203.28 321.76,192.02 324.83,193.69 327.90,199.73 330.97,200.99 334.04,214.33 337.11,209.95 340.18,208.07 343.25,233.30 346.32,226.62 349.39,235.80 352.46,207.45 355.53,241.01 358.60,253.31 361.67,245.59 364.74,243.93 367.81,259.14 370.88,250.60 373.95,246.22 377.02,251.22 380.09,263.94 383.16,264.56 386.23,257.89 389.30,268.94 392.36,288.12 395.43,292.70 398.50,287.91 401.57,313.96 404.64,309.17 407.71,295.20 410.78,313.34 413.85,306.67 416.92,310.21 419.99,319.38 423.06,338.14 426.13,346.27 429.20,340.23 432.27,329.60 435.34,325.64 438.41,344.40 441.48,343.15 444.55,346.90 447.62,356.90 450.69,338.77 453.76,361.28 456.83,362.74 459.90,383.59 462.97,371.08 466.04,369.83 469.11,366.28 472.17,373.79 475.24,377.75 478.31,374.41 481.38,379.42 484.45,377.12 487.52,385.25 490.59,392.76 493.66,384.63 496.73,385.05 499.80,395.47 502.87,385.88 505.94,400.26 509.01,410.89 512.08,406.10 515.15,411.52 518.22,416.31 521.29,406.31 524.36,419.86 527.43,419.02 530.50,419.23 533.57,409.85 536.64,431.32 539.71,428.61 542.78,437.37 545.85,441.12 548.92,427.99 551.98,436.95 555.05,445.91 558.12,443.62 561.19,444.66 564.26,441.53 567.33,448.83 570.40,448.20 573.47,455.08 576.54,456.33 579.61,461.75 582.68,460.71 585.75,458.21 588.82,463.21 591.89,467.17 594.96,465.09 598.03,466.34 601.10,465.71 604.17,456.75 607.24,475.30 610.31,475.72 613.38,483.64 616.45,476.35 619.52,477.60 622.59,489.69 625.66,481.97 628.72,488.23 631.79,473.64 634.86,488.64 637.93,491.77 641.00,491.56 644.07,491.56 647.14,492.60 650.21,498.65 653.28,501.36 656.35,496.77 659.42,500.53 662.49,506.78 665.56,495.94 668.63,504.90 671.70,505.95 674.77,509.49 677.84,505.74 680.91,506.99 683.98,511.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,144.29 76.19,134.28 79.26,138.45 82.33,111.56 85.40,118.02 88.47,115.73 91.54,96.34 94.61,108.02 97.68,109.06 100.75,116.77 103.82,110.10 106.89,104.27 109.96,100.31 113.03,117.19 116.10,116.36 119.17,91.55 122.24,106.56 125.31,104.89 128.38,105.31 131.45,100.51 134.52,106.77 137.59,108.43 140.66,109.27 143.73,97.60 146.80,98.01 149.87,110.94 152.94,101.97 156.00,95.09 159.07,108.43 162.14,87.59 165.21,79.67 168.28,88.22 171.35,84.88 174.42,84.46 177.49,81.34 180.56,48.40 183.63,67.16 186.70,88.63 189.77,91.13 192.84,84.25 195.91,83.63 198.98,73.42 202.05,69.87 205.12,77.38 208.19,96.55 211.26,78.00 214.33,78.42 217.40,86.96 220.47,72.79 223.54,71.12 226.61,85.92 229.68,69.04 232.75,84.25 235.81,88.01 238.88,99.05 241.95,90.30 245.02,81.13 248.09,92.80 251.16,90.51 254.23,111.14 257.30,115.11 260.37,111.14 263.44,120.52 266.51,101.97 269.58,133.66 272.65,132.20 275.72,115.94 278.79,135.12 281.86,141.37 284.93,131.99 288.00,130.32 291.07,137.83 294.14,176.18 297.21,157.84 300.28,175.97 303.35,174.72 306.42,178.47 309.49,168.68 312.56,189.94 315.62,195.57 318.69,191.40 321.76,196.61 324.83,211.41 327.90,200.36 330.97,188.69 334.04,210.99 337.11,212.87 340.18,208.49 343.25,225.17 346.32,214.12 349.39,224.75 352.46,228.50 355.53,231.21 358.60,234.55 361.67,247.47 364.74,242.68 367.81,254.14 370.88,266.02 373.95,263.52 377.02,269.57 380.09,254.35 383.16,265.19 386.23,275.61 389.30,269.15 392.36,264.15 395.43,266.23 398.50,279.15 401.57,302.08 404.64,298.96 407.71,303.75 410.78,300.83 413.85,310.00 416.92,319.38 419.99,310.00 423.06,322.30 426.13,316.88 429.20,324.39 432.27,341.69 435.34,330.22 438.41,344.40 441.48,347.73 444.55,339.40 447.62,364.41 450.69,346.48 453.76,344.81 456.83,354.61 459.90,353.57 462.97,368.58 466.04,369.41 469.11,382.13 472.17,373.79 475.24,373.16 478.31,376.08 481.38,381.50 484.45,370.04 487.52,384.21 490.59,395.47 493.66,389.42 496.73,393.17 499.80,398.39 502.87,405.89 505.94,397.34 509.01,398.59 512.08,414.02 515.15,416.31 518.22,412.35 521.29,410.48 524.36,419.23 527.43,419.23 530.50,415.48 533.57,411.10 536.64,424.86 539.71,428.19 542.78,430.07 545.85,430.28 548.92,437.57 551.98,432.36 555.05,427.78 558.12,431.11 561.19,447.58 564.26,445.29 567.33,448.83 570.40,454.46 573.47,444.87 576.54,458.84 579.61,449.46 582.68,450.50 585.75,459.25 588.82,459.67 591.89,456.75 594.96,457.79 598.03,462.59 601.10,466.34 604.17,468.22 607.24,477.60 610.31,473.64 613.38,483.64 616.45,476.97 619.52,479.47 622.59,481.97 625.66,479.68 628.72,492.60 631.79,485.73 634.86,487.60 637.93,493.23 641.00,491.56 644.07,499.90 647.14,493.02 650.21,502.19 653.28,499.27 656.35,504.49 659.42,495.94 662.49,502.40 665.56,505.11 668.63,504.49 671.70,507.61 674.77,508.65 677.84,507.40 680.91,506.36 683.98,509.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,139.29 76.19,123.86 79.26,139.91 82.33,109.06 85.40,126.57 88.47,127.20 91.54,119.48 94.61,112.81 97.68,121.78 100.75,115.52 103.82,103.85 106.89,110.94 109.96,80.92 113.03,110.31 116.10,96.76 119.17,106.56 122.24,99.47 125.31,119.48 128.38,95.72 131.45,94.68 134.52,106.98 137.59,94.89 140.66,98.85 143.73,89.47 146.80,87.17 149.87,88.01 152.94,101.97 156.00,99.47 159.07,104.47 162.14,82.38 165.21,81.96 168.28,88.22 171.35,106.77 174.42,70.29 177.49,80.71 180.56,89.05 183.63,96.55 186.70,98.01 189.77,64.24 192.84,84.05 195.91,84.25 198.98,88.63 202.05,70.71 205.12,99.05 208.19,89.47 211.26,90.93 214.33,89.05 217.40,77.58 220.47,75.29 223.54,75.71 226.61,77.38 229.68,102.81 232.75,97.80 235.81,94.05 238.88,93.63 241.95,94.47 245.02,95.93 248.09,89.88 251.16,119.27 254.23,110.10 257.30,118.23 260.37,105.10 263.44,100.93 266.51,126.99 269.58,120.73 272.65,122.82 275.72,121.57 278.79,136.99 281.86,121.98 284.93,134.91 288.00,145.12 291.07,156.59 294.14,154.50 297.21,162.42 300.28,160.76 303.35,164.09 306.42,186.60 309.49,180.77 312.56,187.23 315.62,187.64 318.69,184.52 321.76,202.03 324.83,216.41 327.90,183.27 330.97,204.53 334.04,199.11 337.11,211.82 340.18,219.54 343.25,224.75 346.32,204.95 349.39,238.09 352.46,238.92 355.53,238.09 358.60,229.33 361.67,239.97 364.74,256.64 367.81,257.06 370.88,241.63 373.95,265.19 377.02,252.47 380.09,265.81 383.16,264.35 386.23,272.07 389.30,283.11 392.36,278.32 395.43,285.20 398.50,285.82 401.57,290.41 404.64,303.54 407.71,317.92 410.78,312.92 413.85,316.26 416.92,305.00 419.99,321.47 423.06,326.89 426.13,339.40 429.20,344.61 432.27,337.10 435.34,330.85 438.41,346.90 441.48,340.23 444.55,350.44 447.62,357.32 450.69,358.16 453.76,364.20 456.83,354.61 459.90,360.03 462.97,367.12 466.04,366.08 469.11,370.45 472.17,383.38 475.24,387.34 478.31,380.04 481.38,376.29 484.45,388.17 487.52,394.84 490.59,378.58 493.66,392.76 496.73,395.47 499.80,396.30 502.87,391.92 505.94,401.10 509.01,393.38 512.08,409.43 515.15,416.73 518.22,410.89 521.29,403.60 524.36,402.55 527.43,414.44 530.50,430.28 533.57,418.61 536.64,417.56 539.71,421.52 542.78,436.12 545.85,435.07 548.92,428.40 551.98,429.24 555.05,432.78 558.12,442.58 561.19,445.29 564.26,452.37 567.33,446.54 570.40,446.54 573.47,444.87 576.54,447.37 579.61,454.88 582.68,454.25 585.75,456.75 588.82,458.42 591.89,468.42 594.96,472.59 598.03,463.63 601.10,470.93 604.17,477.39 607.24,468.42 610.31,470.09 613.38,474.05 616.45,481.35 619.52,482.60 622.59,479.26 625.66,489.48 628.72,486.98 631.79,483.02 634.86,493.44 637.93,483.64 641.00,490.73 644.07,499.90 647.14,504.07 650.21,498.23 653.28,500.94 656.35,497.82 659.42,500.94 662.49,500.73 665.56,502.40 668.63,502.40 671.70,502.82 674.77,511.78 677.84,512.62 680.91,513.03 683.98,509.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,135.53 76.19,131.57 79.26,127.40 82.33,147.21 85.40,124.28 88.47,129.49 91.54,117.19 94.61,106.77 97.68,133.45 100.75,118.23 103.82,117.81 106.89,130.74 109.96,106.14 113.03,106.14 116.10,114.48 119.17,92.80 122.24,100.93 125.31,101.76 128.38,84.67 131.45,112.19 134.52,111.77 137.59,80.92 140.66,108.02 143.73,95.51 146.80,84.05 149.87,102.60 152.94,91.76 156.00,85.71 159.07,90.51 162.14,62.99 165.21,101.56 168.28,80.09 171.35,90.30 174.42,92.18 177.49,98.43 180.56,90.93 183.63,100.72 186.70,77.58 189.77,77.17 192.84,105.93 195.91,78.00 198.98,66.12 202.05,71.54 205.12,83.42 208.19,96.34 211.26,82.38 214.33,65.49 217.40,64.66 220.47,82.38 223.54,90.93 226.61,84.67 229.68,83.84 232.75,120.11 235.81,117.40 238.88,99.47 241.95,90.51 245.02,89.47 248.09,102.39 251.16,113.23 254.23,121.98 257.30,112.81 260.37,101.35 263.44,107.39 266.51,132.82 269.58,144.50 272.65,131.99 275.72,135.74 278.79,129.28 281.86,147.41 284.93,161.38 288.00,140.33 291.07,146.79 294.14,138.66 297.21,154.08 300.28,168.47 303.35,162.21 306.42,157.00 309.49,173.68 312.56,167.84 315.62,178.89 318.69,179.93 321.76,174.30 324.83,184.52 327.90,196.82 330.97,218.29 334.04,202.24 337.11,209.32 340.18,217.45 343.25,223.08 346.32,233.50 349.39,229.13 352.46,235.59 355.53,252.06 358.60,236.42 361.67,244.13 364.74,244.97 367.81,249.55 370.88,250.80 373.95,256.02 377.02,280.20 380.09,257.48 383.16,276.44 386.23,270.19 389.30,286.24 392.36,282.49 395.43,283.53 398.50,290.83 401.57,282.91 404.64,321.68 407.71,285.41 410.78,308.54 413.85,304.58 416.92,294.79 419.99,323.14 423.06,322.30 426.13,330.64 429.20,322.09 432.27,334.39 435.34,327.10 438.41,328.14 441.48,340.85 444.55,356.28 447.62,352.32 450.69,355.86 453.76,366.49 456.83,369.41 459.90,354.40 462.97,352.53 466.04,366.28 469.11,374.21 472.17,381.71 475.24,374.62 478.31,388.59 481.38,387.55 484.45,379.42 487.52,376.50 490.59,392.13 493.66,382.13 496.73,398.80 499.80,399.43 502.87,394.84 505.94,400.47 509.01,389.21 512.08,403.18 515.15,413.60 518.22,399.64 521.29,416.31 524.36,427.57 527.43,419.44 530.50,426.73 533.57,411.31 536.64,438.62 539.71,426.11 542.78,430.90 545.85,431.32 548.92,443.41 551.98,439.24 555.05,430.70 558.12,435.91 561.19,450.08 564.26,446.75 567.33,443.20 570.40,453.42 573.47,455.92 576.54,446.75 579.61,452.79 582.68,461.96 585.75,467.59 588.82,460.09 591.89,460.29 594.96,463.00 598.03,466.13 601.10,476.35 604.17,469.68 607.24,480.10 610.31,481.35 613.38,470.51 616.45,476.55 619.52,489.69 622.59,483.43 625.66,481.97 628.72,486.77 631.79,482.39 634.86,490.94 637.93,488.02 641.00,490.94 644.07,490.52 647.14,491.56 650.21,493.65 653.28,493.23 656.35,504.07 659.42,499.48 662.49,504.49 665.56,505.74 668.63,499.27 671.70,512.82 674.77,508.24 677.84,504.28 680.91,502.19 683.98,501.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,141.99 76.19,123.03 79.26,116.15 82.33,121.15 85.40,118.23 88.47,113.85 91.54,111.77 94.61,128.86 97.68,107.39 100.75,107.60 103.82,80.71 106.89,105.10 109.96,108.85 113.03,102.39 116.10,115.52 119.17,121.36 122.24,110.10 125.31,116.77 128.38,96.97 131.45,112.40 134.52,104.06 137.59,113.65 140.66,107.39 143.73,87.17 146.80,91.76 149.87,95.93 152.94,87.38 156.00,95.30 159.07,77.58 162.14,99.47 165.21,101.97 168.28,99.89 171.35,115.52 174.42,73.62 177.49,74.67 180.56,83.21 183.63,99.05 186.70,81.54 189.77,79.67 192.84,77.79 195.91,64.66 198.98,96.34 202.05,65.49 205.12,80.50 208.19,90.51 211.26,80.71 214.33,104.47 217.40,64.24 220.47,88.01 223.54,102.60 226.61,99.26 229.68,76.75 232.75,98.64 235.81,111.14 238.88,90.72 241.95,81.13 245.02,95.93 248.09,113.44 251.16,105.31 254.23,108.02 257.30,113.02 260.37,112.60 263.44,126.15 266.51,124.49 269.58,98.43 272.65,130.74 275.72,132.41 278.79,135.12 281.86,139.91 284.93,146.58 288.00,132.41 291.07,153.67 294.14,164.09 297.21,151.58 300.28,163.47 303.35,164.92 306.42,157.63 309.49,170.34 312.56,174.93 315.62,157.21 318.69,174.93 321.76,191.81 324.83,195.15 327.90,197.44 330.97,203.90 334.04,212.03 337.11,207.86 340.18,210.57 343.25,200.99 346.32,219.54 349.39,237.46 352.46,242.88 355.53,247.26 358.60,238.09 361.67,248.09 364.74,244.76 367.81,236.42 370.88,262.89 373.95,269.15 377.02,256.64 380.09,271.65 383.16,272.48 386.23,276.24 389.30,287.70 392.36,272.90 395.43,293.33 398.50,308.54 401.57,306.46 404.64,308.34 407.71,295.00 410.78,305.63 413.85,311.67 416.92,305.84 419.99,317.09 423.06,308.13 426.13,322.51 429.20,328.56 432.27,342.52 435.34,332.31 438.41,331.47 441.48,339.60 444.55,358.78 447.62,362.12 450.69,361.07 453.76,350.44 456.83,351.28 459.90,378.17 462.97,368.16 466.04,369.20 469.11,387.13 472.17,378.58 475.24,379.00 478.31,377.96 481.38,395.05 484.45,385.67 487.52,384.63 490.59,383.38 493.66,404.43 496.73,379.00 499.80,384.00 502.87,390.88 505.94,399.64 509.01,399.64 512.08,407.14 515.15,420.69 518.22,411.73 521.29,415.69 524.36,406.93 527.43,410.06 530.50,417.77 533.57,418.61 536.64,434.45 539.71,426.11 542.78,429.86 545.85,424.86 548.92,416.73 551.98,439.24 555.05,443.41 558.12,434.03 561.19,440.28 564.26,440.49 567.33,459.25 570.40,452.79 573.47,446.75 576.54,453.62 579.61,461.96 582.68,463.21 585.75,468.42 588.82,459.25 591.89,467.38 594.96,471.55 598.03,467.38 601.10,467.38 604.17,471.97 607.24,468.01 610.31,471.34 613.38,472.59 616.45,469.47 619.52,492.19 622.59,475.09 625.66,486.35 628.72,483.43 631.79,490.10 634.86,495.73 637.93,482.18 641.00,498.65 644.07,498.65 647.14,499.07 650.21,501.57 653.28,501.57 656.35,500.94 659.42,500.94 662.49,502.40 665.56,499.48 668.63,508.86 671.70,507.20 674.77,503.65 677.84,508.45 680.91,512.20 683.98,513.66 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,136.99 76.19,133.03 79.26,110.10 82.33,126.57 85.40,134.91 88.47,115.73 91.54,106.98 94.61,114.90 97.68,119.27 100.75,109.48 103.82,108.02 106.89,96.14 109.96,123.44 113.03,110.73 116.10,127.82 119.17,108.02 122.24,118.44 125.31,110.31 128.38,99.68 131.45,83.63 134.52,95.09 137.59,82.38 140.66,90.09 143.73,90.30 146.80,97.80 149.87,93.84 152.94,96.34 156.00,73.21 159.07,83.42 162.14,90.30 165.21,88.63 168.28,106.35 171.35,65.49 174.42,78.42 177.49,83.63 180.56,90.72 183.63,77.79 186.70,95.09 189.77,91.34 192.84,71.54 195.91,73.83 198.98,86.76 202.05,94.05 205.12,90.09 208.19,96.97 211.26,90.30 214.33,84.88 217.40,77.79 220.47,91.55 223.54,93.01 226.61,74.04 229.68,81.54 232.75,92.38 235.81,75.92 238.88,103.22 241.95,104.27 245.02,110.94 248.09,98.64 251.16,108.23 254.23,99.26 257.30,128.24 260.37,119.07 263.44,117.81 266.51,108.23 269.58,137.83 272.65,116.98 275.72,127.82 278.79,136.16 281.86,135.74 284.93,135.32 288.00,156.17 291.07,135.12 294.14,161.59 297.21,179.52 300.28,143.25 303.35,157.42 306.42,179.93 309.49,174.10 312.56,176.39 315.62,185.14 318.69,185.56 321.76,192.23 324.83,178.26 327.90,193.06 330.97,204.11 334.04,210.57 337.11,212.45 340.18,205.57 343.25,211.82 346.32,233.50 349.39,213.28 352.46,227.04 355.53,251.85 358.60,235.59 361.67,243.51 364.74,261.23 367.81,264.77 370.88,250.39 373.95,252.89 377.02,275.19 380.09,278.11 383.16,281.66 386.23,267.69 389.30,281.45 392.36,286.24 395.43,307.50 398.50,296.87 401.57,300.83 404.64,292.49 407.71,301.46 410.78,309.38 413.85,309.80 416.92,309.80 419.99,301.04 423.06,323.76 426.13,316.88 429.20,323.55 432.27,333.56 435.34,340.02 438.41,343.36 441.48,338.14 444.55,339.81 447.62,357.74 450.69,335.43 453.76,349.61 456.83,355.45 459.90,360.24 462.97,361.91 466.04,373.58 469.11,357.53 472.17,371.08 475.24,380.67 478.31,378.58 481.38,375.46 484.45,371.29 487.52,383.17 490.59,382.75 493.66,393.17 496.73,403.39 499.80,400.26 502.87,394.01 505.94,399.64 509.01,414.02 512.08,400.47 515.15,399.22 518.22,420.69 521.29,411.73 524.36,427.36 527.43,429.86 530.50,427.36 533.57,417.77 536.64,423.82 539.71,425.69 542.78,441.95 545.85,434.45 548.92,427.36 551.98,437.57 555.05,436.74 558.12,448.00 561.19,438.82 564.26,445.08 567.33,460.09 570.40,452.79 573.47,450.71 576.54,455.08 579.61,454.46 582.68,460.71 585.75,453.00 588.82,472.80 591.89,468.22 594.96,460.29 598.03,470.09 601.10,467.80 604.17,471.76 607.24,469.47 610.31,475.51 613.38,483.85 616.45,470.93 619.52,473.43 622.59,474.26 625.66,488.23 628.72,487.18 631.79,489.48 634.86,487.81 637.93,493.65 641.00,494.27 644.07,495.11 647.14,489.69 650.21,496.56 653.28,494.48 656.35,492.40 659.42,499.69 662.49,500.32 665.56,501.98 668.63,500.73 671.70,509.91 674.77,503.44 677.84,510.32 680.91,508.03 683.98,503.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,121.36 76.19,124.69 79.26,137.20 82.33,107.60 85.40,126.15 88.47,117.19 91.54,127.20 94.61,125.53 97.68,124.07 100.75,100.72 103.82,104.89 106.89,113.85 109.96,105.72 113.03,117.40 116.10,109.06 119.17,121.36 122.24,128.86 125.31,115.73 128.38,126.78 131.45,101.97 134.52,99.47 137.59,108.23 140.66,86.76 143.73,88.42 146.80,92.18 149.87,107.39 152.94,81.34 156.00,91.97 159.07,93.63 162.14,100.93 165.21,79.04 168.28,104.06 171.35,94.26 174.42,108.43 177.49,93.43 180.56,70.71 183.63,81.13 186.70,100.93 189.77,104.68 192.84,87.59 195.91,91.55 198.98,74.87 202.05,77.38 205.12,73.83 208.19,105.31 211.26,91.76 214.33,109.06 217.40,100.51 220.47,90.93 223.54,103.02 226.61,102.39 229.68,95.09 232.75,90.51 235.81,92.80 238.88,74.46 241.95,124.69 245.02,106.77 248.09,110.52 251.16,112.81 254.23,99.26 257.30,136.37 260.37,120.52 263.44,115.94 266.51,121.98 269.58,123.44 272.65,143.87 275.72,142.83 278.79,129.90 281.86,124.07 284.93,146.16 288.00,142.62 291.07,155.96 294.14,146.16 297.21,162.63 300.28,151.58 303.35,164.09 306.42,179.31 309.49,169.09 312.56,182.85 315.62,179.93 318.69,186.81 321.76,199.11 324.83,194.73 327.90,199.32 330.97,196.61 334.04,190.15 337.11,212.24 340.18,227.25 343.25,223.71 346.32,228.92 349.39,233.92 352.46,244.76 355.53,247.05 358.60,242.47 361.67,248.09 364.74,248.09 367.81,262.27 370.88,242.88 373.95,269.57 377.02,260.18 380.09,277.28 383.16,270.19 386.23,277.28 389.30,291.87 392.36,296.87 395.43,298.75 398.50,290.62 401.57,291.66 404.64,313.55 407.71,316.47 410.78,314.17 413.85,301.67 416.92,311.25 419.99,312.92 423.06,325.22 426.13,336.48 429.20,328.14 432.27,338.14 435.34,335.02 438.41,357.11 441.48,345.23 444.55,346.07 447.62,353.57 450.69,353.57 453.76,356.49 456.83,361.07 459.90,362.32 462.97,362.32 466.04,365.24 469.11,375.04 472.17,370.66 475.24,384.21 478.31,384.00 481.38,389.21 484.45,379.00 487.52,395.88 490.59,392.34 493.66,402.35 496.73,404.01 499.80,384.84 502.87,402.35 505.94,398.80 509.01,401.10 512.08,407.97 515.15,402.14 518.22,406.31 521.29,407.56 524.36,403.39 527.43,413.81 530.50,425.48 533.57,411.94 536.64,424.44 539.71,417.35 542.78,433.20 545.85,432.99 548.92,429.03 551.98,441.74 555.05,428.61 558.12,432.15 561.19,442.37 564.26,444.87 567.33,441.12 570.40,440.70 573.47,447.79 576.54,439.45 579.61,449.66 582.68,459.67 585.75,464.88 588.82,462.59 591.89,457.59 594.96,466.55 598.03,475.30 601.10,472.59 604.17,468.63 607.24,475.72 610.31,475.30 613.38,480.93 616.45,479.89 619.52,466.55 622.59,479.89 625.66,489.06 628.72,485.31 631.79,487.60 634.86,489.89 637.93,491.56 641.00,489.06 644.07,495.94 647.14,496.15 650.21,495.73 653.28,495.52 656.35,503.24 659.42,495.94 662.49,501.78 665.56,500.53 668.63,506.78 671.70,496.56 674.77,509.49 677.84,497.40 680.91,518.45 683.98,510.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,124.90 76.19,137.62 79.26,149.29 82.33,137.20 85.40,105.31 88.47,114.48 91.54,131.57 94.61,127.40 97.68,105.72 100.75,116.56 103.82,111.98 106.89,105.93 109.96,125.74 113.03,111.14 116.10,92.38 119.17,107.60 122.24,94.89 125.31,106.35 128.38,86.76 131.45,93.22 134.52,93.01 137.59,98.22 140.66,84.67 143.73,106.35 146.80,107.39 149.87,88.42 152.94,104.06 156.00,91.76 159.07,93.01 162.14,101.76 165.21,94.68 168.28,85.92 171.35,100.10 174.42,78.84 177.49,82.17 180.56,74.25 183.63,67.79 186.70,87.59 189.77,83.21 192.84,69.25 195.91,86.76 198.98,87.80 202.05,94.89 205.12,106.35 208.19,73.00 211.26,76.54 214.33,63.41 217.40,89.47 220.47,80.29 223.54,84.67 226.61,87.59 229.68,92.59 232.75,82.59 235.81,98.85 238.88,86.13 241.95,102.81 245.02,96.34 248.09,102.39 251.16,96.97 254.23,110.94 257.30,103.85 260.37,91.34 263.44,118.86 266.51,106.35 269.58,114.27 272.65,119.90 275.72,128.65 278.79,145.12 281.86,124.69 284.93,127.40 288.00,157.42 291.07,150.54 294.14,154.71 297.21,164.30 300.28,147.41 303.35,169.51 306.42,157.42 309.49,159.50 312.56,201.40 315.62,173.47 318.69,195.57 321.76,200.36 324.83,219.12 327.90,193.06 330.97,206.41 334.04,205.78 337.11,198.48 340.18,209.32 343.25,222.87 346.32,234.13 349.39,227.67 352.46,224.75 355.53,230.17 358.60,234.96 361.67,226.83 364.74,240.80 367.81,250.60 370.88,259.98 373.95,257.27 377.02,264.77 380.09,256.02 383.16,252.89 386.23,284.99 389.30,278.53 392.36,285.62 395.43,290.62 398.50,275.40 401.57,297.91 404.64,300.42 407.71,300.21 410.78,318.13 413.85,303.96 416.92,309.17 419.99,316.05 423.06,333.56 426.13,326.68 429.20,328.97 432.27,340.44 435.34,337.52 438.41,336.48 441.48,349.19 444.55,368.79 447.62,357.74 450.69,357.53 453.76,369.20 456.83,369.62 459.90,365.45 462.97,365.24 466.04,362.32 469.11,374.00 472.17,372.75 475.24,377.54 478.31,380.25 481.38,378.17 484.45,383.17 487.52,385.88 490.59,381.08 493.66,385.46 496.73,391.09 499.80,392.76 502.87,396.72 505.94,393.17 509.01,401.51 512.08,406.10 515.15,402.35 518.22,408.39 521.29,408.81 524.36,422.57 527.43,432.99 530.50,414.85 533.57,418.81 536.64,424.23 539.71,419.02 542.78,426.53 545.85,439.24 548.92,421.94 551.98,426.53 555.05,424.65 558.12,437.57 561.19,437.57 564.26,442.16 567.33,446.75 570.40,450.50 573.47,452.58 576.54,464.26 579.61,452.37 582.68,455.29 585.75,457.59 588.82,457.59 591.89,472.38 594.96,466.34 598.03,465.92 601.10,458.00 604.17,469.68 607.24,476.55 610.31,473.84 613.38,471.97 616.45,475.09 619.52,474.26 622.59,485.52 625.66,476.14 628.72,485.73 631.79,480.72 634.86,487.18 637.93,484.06 641.00,495.94 644.07,480.51 647.14,484.89 650.21,503.24 653.28,500.53 656.35,506.78 659.42,497.61 662.49,496.77 665.56,500.94 668.63,508.86 671.70,502.19 674.77,511.57 677.84,505.95 680.91,500.73 683.98,511.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,107.39 76.19,147.83 79.26,136.99 82.33,122.40 85.40,136.58 88.47,108.43 91.54,112.40 94.61,131.36 97.68,118.23 100.75,118.23 103.82,100.51 106.89,114.90 109.96,110.52 113.03,114.27 116.10,116.98 119.17,104.89 122.24,87.17 125.31,103.22 128.38,111.14 131.45,100.72 134.52,101.35 137.59,83.63 140.66,87.38 143.73,116.15 146.80,89.05 149.87,91.76 152.94,86.55 156.00,107.39 159.07,119.27 162.14,77.38 165.21,96.34 168.28,88.01 171.35,92.38 174.42,94.05 177.49,84.46 180.56,89.47 183.63,78.21 186.70,78.42 189.77,75.92 192.84,66.33 195.91,62.16 198.98,73.21 202.05,82.59 205.12,90.09 208.19,80.50 211.26,91.34 214.33,95.09 217.40,101.97 220.47,92.59 223.54,85.30 226.61,88.01 229.68,104.89 232.75,99.68 235.81,101.35 238.88,99.89 241.95,111.77 245.02,120.52 248.09,112.81 251.16,99.68 254.23,117.40 257.30,120.32 260.37,109.48 263.44,103.22 266.51,126.15 269.58,125.53 272.65,118.02 275.72,125.11 278.79,143.87 281.86,137.20 284.93,138.45 288.00,149.71 291.07,143.45 294.14,147.83 297.21,157.21 300.28,156.79 303.35,157.00 306.42,175.35 309.49,186.60 312.56,176.39 315.62,187.85 318.69,182.23 321.76,198.90 324.83,192.86 327.90,205.36 330.97,198.90 334.04,204.32 337.11,219.54 340.18,223.08 343.25,221.21 346.32,218.50 349.39,243.30 352.46,223.91 355.53,232.46 358.60,223.08 361.67,226.00 364.74,256.02 367.81,245.59 370.88,244.55 373.95,252.89 377.02,261.23 380.09,277.07 383.16,266.86 386.23,269.15 389.30,279.99 392.36,291.45 395.43,281.66 398.50,293.75 401.57,312.51 404.64,307.29 407.71,303.54 410.78,315.63 413.85,321.05 416.92,311.05 419.99,324.39 423.06,318.34 426.13,340.44 429.20,335.23 432.27,339.40 435.34,345.65 438.41,356.49 441.48,342.73 444.55,339.81 447.62,358.57 450.69,352.53 453.76,361.07 456.83,354.61 459.90,365.03 462.97,374.41 466.04,376.08 469.11,371.08 472.17,379.21 475.24,381.29 478.31,382.96 481.38,378.58 484.45,389.42 487.52,391.72 490.59,398.80 493.66,381.50 496.73,389.42 499.80,396.93 502.87,390.26 505.94,406.72 509.01,400.05 512.08,390.46 515.15,405.47 518.22,415.06 521.29,416.31 524.36,406.10 527.43,411.10 530.50,422.77 533.57,428.61 536.64,422.77 539.71,419.02 542.78,429.03 545.85,428.40 548.92,425.48 551.98,435.28 555.05,440.91 558.12,432.36 561.19,447.37 564.26,448.20 567.33,441.33 570.40,451.75 573.47,449.25 576.54,459.04 579.61,458.84 582.68,469.47 585.75,463.63 588.82,470.09 591.89,475.30 594.96,470.09 598.03,467.59 601.10,459.67 604.17,473.22 607.24,468.63 610.31,473.43 613.38,475.72 616.45,486.14 619.52,483.85 622.59,486.77 625.66,488.85 628.72,491.98 631.79,492.40 634.86,491.15 637.93,502.19 641.00,489.89 644.07,494.48 647.14,487.60 650.21,501.36 653.28,500.11 656.35,497.82 659.42,497.82 662.49,502.40 665.56,501.15 668.63,506.15 671.70,501.36 674.77,503.65 677.84,502.82 680.91,501.78 683.98,508.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,133.24 76.19,129.49 79.26,114.48 82.33,122.19 85.40,130.53 88.47,115.73 91.54,142.62 94.61,105.31 97.68,117.61 100.75,119.69 103.82,93.84 106.89,108.64 109.96,121.78 113.03,95.09 116.10,103.64 119.17,107.39 122.24,97.18 125.31,102.18 128.38,107.39 131.45,96.34 134.52,97.60 137.59,96.97 140.66,96.55 143.73,89.05 146.80,100.10 149.87,102.39 152.94,104.06 156.00,93.84 159.07,95.72 162.14,113.02 165.21,74.46 168.28,89.05 171.35,80.71 174.42,92.80 177.49,91.55 180.56,75.08 183.63,86.34 186.70,69.66 189.77,71.54 192.84,76.54 195.91,69.04 198.98,68.62 202.05,65.91 205.12,80.50 208.19,77.17 211.26,89.67 214.33,95.30 217.40,79.04 220.47,85.71 223.54,101.56 226.61,94.26 229.68,89.26 232.75,90.09 235.81,90.51 238.88,114.48 241.95,105.31 245.02,110.10 248.09,98.43 251.16,127.61 254.23,117.19 257.30,100.93 260.37,123.65 263.44,108.64 266.51,117.40 269.58,132.20 272.65,132.82 275.72,127.61 278.79,134.28 281.86,128.24 284.93,145.33 288.00,153.67 291.07,144.50 294.14,160.76 297.21,148.25 300.28,151.38 303.35,168.26 306.42,168.88 309.49,159.71 312.56,164.92 315.62,174.51 318.69,173.68 321.76,171.18 324.83,202.03 327.90,193.90 330.97,194.94 334.04,198.07 337.11,197.86 340.18,218.70 343.25,225.37 346.32,220.16 349.39,229.33 352.46,217.45 355.53,232.67 358.60,253.10 361.67,242.05 364.74,236.21 367.81,249.14 370.88,246.64 373.95,258.10 377.02,255.60 380.09,264.77 383.16,266.65 386.23,269.36 389.30,280.40 392.36,287.91 395.43,295.20 398.50,302.29 401.57,296.45 404.64,310.42 407.71,302.50 410.78,298.54 413.85,312.09 416.92,318.55 419.99,326.68 423.06,315.63 426.13,335.02 429.20,341.69 432.27,334.81 435.34,337.73 438.41,339.40 441.48,349.61 444.55,357.74 447.62,351.49 450.69,354.40 453.76,364.20 456.83,355.65 459.90,370.87 462.97,359.20 466.04,364.83 469.11,369.41 472.17,372.12 475.24,381.92 478.31,387.96 481.38,393.59 484.45,388.17 487.52,389.63 490.59,379.00 493.66,396.09 496.73,385.67 499.80,399.01 502.87,395.68 505.94,393.38 509.01,400.68 512.08,405.47 515.15,405.06 518.22,411.73 521.29,415.90 524.36,428.19 527.43,415.27 530.50,425.69 533.57,425.28 536.64,414.85 539.71,422.57 542.78,427.15 545.85,430.70 548.92,423.40 551.98,437.57 555.05,426.53 558.12,441.53 561.19,438.41 564.26,445.08 567.33,445.29 570.40,442.79 573.47,451.75 576.54,449.25 579.61,460.71 582.68,449.25 585.75,468.63 588.82,459.04 591.89,458.00 594.96,460.71 598.03,460.09 601.10,453.62 604.17,470.30 607.24,470.93 610.31,475.72 613.38,484.47 616.45,476.55 619.52,478.64 622.59,480.93 625.66,484.89 628.72,492.40 631.79,488.02 634.86,492.40 637.93,495.73 641.00,501.57 644.07,495.73 647.14,491.56 650.21,495.52 653.28,489.27 656.35,502.82 659.42,502.19 662.49,511.99 665.56,503.44 668.63,505.74 671.70,511.36 674.77,500.94 677.84,497.19 680.91,509.70 683.98,509.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,123.86 76.19,128.45 79.26,142.20 82.33,122.82 85.40,111.77 88.47,123.65 91.54,111.14 94.61,130.53 97.68,98.01 100.75,121.98 103.82,117.81 106.89,107.18 109.96,121.15 113.03,95.30 116.10,115.73 119.17,110.52 122.24,109.69 125.31,116.56 128.38,102.60 131.45,92.80 134.52,96.97 137.59,109.89 140.66,100.31 143.73,113.23 146.80,84.05 149.87,97.18 152.94,91.76 156.00,75.29 159.07,94.47 162.14,95.30 165.21,91.13 168.28,110.31 171.35,89.67 174.42,103.85 177.49,98.85 180.56,83.21 183.63,87.59 186.70,78.21 189.77,93.01 192.84,85.71 195.91,61.95 198.98,81.75 202.05,71.96 205.12,76.13 208.19,76.54 211.26,70.91 214.33,92.18 217.40,79.46 220.47,89.05 223.54,72.16 226.61,83.63 229.68,107.39 232.75,84.46 235.81,90.09 238.88,104.27 241.95,88.84 245.02,93.01 248.09,113.23 251.16,114.69 254.23,102.18 257.30,120.94 260.37,119.07 263.44,110.73 266.51,101.35 269.58,118.44 272.65,91.76 275.72,121.15 278.79,125.11 281.86,144.08 284.93,132.20 288.00,122.82 291.07,131.36 294.14,148.67 297.21,159.30 300.28,159.50 303.35,171.39 306.42,162.42 309.49,192.86 312.56,168.88 315.62,169.93 318.69,193.06 321.76,209.74 324.83,195.98 327.90,200.99 330.97,195.57 334.04,206.20 337.11,212.66 340.18,223.91 343.25,207.86 346.32,214.95 349.39,230.17 352.46,230.38 355.53,239.97 358.60,218.08 361.67,238.30 364.74,231.00 367.81,241.84 370.88,258.31 373.95,245.80 377.02,272.07 380.09,260.81 383.16,267.90 386.23,276.24 389.30,276.03 392.36,270.82 395.43,284.78 398.50,301.67 401.57,291.24 404.64,296.87 407.71,301.67 410.78,305.42 413.85,310.63 416.92,306.46 419.99,320.63 423.06,311.67 426.13,325.22 429.20,331.89 432.27,331.06 435.34,346.69 438.41,344.61 441.48,337.73 444.55,352.94 447.62,344.61 450.69,361.70 453.76,354.61 456.83,363.16 459.90,367.74 462.97,365.03 466.04,373.79 469.11,361.49 472.17,371.50 475.24,384.21 478.31,364.62 481.38,371.29 484.45,386.71 487.52,372.54 490.59,392.34 493.66,397.76 496.73,396.72 499.80,396.30 502.87,401.10 505.94,403.18 509.01,400.47 512.08,419.44 515.15,404.01 518.22,406.10 521.29,416.94 524.36,423.40 527.43,414.02 530.50,413.60 533.57,420.69 536.64,428.40 539.71,425.28 542.78,440.28 545.85,432.57 548.92,435.28 551.98,436.12 555.05,437.78 558.12,446.33 561.19,447.37 564.26,430.70 567.33,439.03 570.40,448.20 573.47,450.50 576.54,453.83 579.61,456.75 582.68,462.80 585.75,455.71 588.82,462.59 591.89,459.46 594.96,460.09 598.03,461.34 601.10,468.63 604.17,475.30 607.24,474.05 610.31,476.76 613.38,469.26 616.45,477.39 619.52,480.51 622.59,480.72 625.66,485.52 628.72,486.98 631.79,488.44 634.86,481.97 637.93,490.31 641.00,485.31 644.07,491.77 647.14,493.86 650.21,499.07 653.28,495.31 656.35,498.44 659.42,506.57 662.49,503.65 665.56,503.65 668.63,502.40 671.70,506.15 674.77,505.95 677.84,508.86 680.91,511.78 683.98,504.69 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,137.62 76.19,122.61 79.26,132.41 82.33,133.24 85.40,120.94 88.47,108.64 91.54,128.86 94.61,133.24 97.68,133.45 100.75,122.82 103.82,116.56 106.89,114.06 109.96,114.27 113.03,120.52 116.10,117.19 119.17,113.44 122.24,107.81 125.31,108.85 128.38,90.72 131.45,85.09 134.52,102.60 137.59,94.68 140.66,80.92 143.73,93.43 146.80,82.80 149.87,92.80 152.94,95.72 156.00,86.76 159.07,91.55 162.14,74.67 165.21,90.09 168.28,73.21 171.35,81.96 174.42,85.51 177.49,85.71 180.56,91.97 183.63,71.12 186.70,82.17 189.77,88.84 192.84,94.68 195.91,66.33 198.98,91.97 202.05,83.84 205.12,99.89 208.19,89.67 211.26,86.55 214.33,108.02 217.40,78.00 220.47,83.84 223.54,86.76 226.61,96.55 229.68,87.59 232.75,101.14 235.81,100.10 238.88,83.21 241.95,92.18 245.02,124.28 248.09,108.64 251.16,100.51 254.23,115.11 257.30,101.56 260.37,134.49 263.44,127.82 266.51,122.82 269.58,109.69 272.65,129.07 275.72,128.24 278.79,129.70 281.86,130.53 284.93,129.70 288.00,144.08 291.07,128.65 294.14,159.09 297.21,148.04 300.28,168.26 303.35,149.29 306.42,170.97 309.49,160.55 312.56,173.05 315.62,172.85 318.69,189.10 321.76,184.73 324.83,187.02 327.90,185.98 330.97,183.48 334.04,198.07 337.11,208.70 340.18,205.78 343.25,231.42 346.32,203.28 349.39,226.83 352.46,234.34 355.53,243.51 358.60,229.75 361.67,252.47 364.74,234.13 367.81,239.76 370.88,257.68 373.95,254.97 377.02,261.85 380.09,260.18 383.16,266.23 386.23,280.61 389.30,283.11 392.36,281.24 395.43,293.75 398.50,283.53 401.57,289.78 404.64,299.79 407.71,304.38 410.78,303.75 413.85,305.42 416.92,306.88 419.99,320.43 423.06,320.84 426.13,321.68 429.20,337.31 432.27,346.07 435.34,350.44 438.41,340.65 441.48,341.27 444.55,354.61 447.62,345.44 450.69,360.66 453.76,357.95 456.83,350.65 459.90,372.33 462.97,359.20 466.04,366.70 469.11,367.33 472.17,372.96 475.24,387.13 478.31,371.50 481.38,368.58 484.45,362.74 487.52,389.42 490.59,379.42 493.66,378.17 496.73,389.42 499.80,401.10 502.87,390.46 505.94,399.01 509.01,397.97 512.08,397.34 515.15,409.64 518.22,408.81 521.29,403.18 524.36,411.10 527.43,408.81 530.50,417.77 533.57,417.77 536.64,427.78 539.71,419.86 542.78,405.68 545.85,419.02 548.92,433.61 551.98,446.54 555.05,436.74 558.12,447.79 561.19,450.91 564.26,435.49 567.33,439.03 570.40,449.04 573.47,446.33 576.54,446.54 579.61,457.59 582.68,456.96 585.75,458.84 588.82,456.13 591.89,462.80 594.96,459.25 598.03,469.68 601.10,463.21 604.17,466.97 607.24,463.63 610.31,480.51 613.38,471.13 616.45,488.02 619.52,474.05 622.59,479.06 625.66,490.52 628.72,486.35 631.79,493.86 634.86,484.27 637.93,493.44 641.00,495.73 644.07,494.48 647.14,499.90 650.21,490.31 653.28,504.90 656.35,492.40 659.42,500.11 662.49,509.91 665.56,496.15 668.63,491.77 671.70,498.44 674.77,512.82 677.84,512.41 680.91,505.95 683.98,509.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,127.61 76.19,120.11 79.26,117.19 82.33,129.28 85.40,135.32 88.47,130.32 91.54,141.79 94.61,111.98 97.68,118.65 100.75,115.94 103.82,114.48 106.89,134.49 109.96,110.73 113.03,107.18 116.10,96.55 119.17,95.09 122.24,111.98 125.31,99.89 128.38,83.63 131.45,118.02 134.52,105.93 137.59,125.32 140.66,94.05 143.73,113.23 146.80,116.77 149.87,97.80 152.94,102.81 156.00,95.51 159.07,100.72 162.14,95.72 165.21,99.05 168.28,86.13 171.35,96.55 174.42,84.05 177.49,85.71 180.56,94.47 183.63,81.34 186.70,76.54 189.77,97.80 192.84,90.30 195.91,78.00 198.98,94.89 202.05,83.63 205.12,76.96 208.19,83.84 211.26,96.55 214.33,100.31 217.40,103.64 220.47,75.08 223.54,86.13 226.61,88.84 229.68,93.22 232.75,93.84 235.81,109.48 238.88,93.63 241.95,109.69 245.02,99.05 248.09,107.18 251.16,110.52 254.23,102.81 257.30,115.52 260.37,121.78 263.44,123.23 266.51,123.44 269.58,107.60 272.65,134.28 275.72,150.54 278.79,112.19 281.86,127.82 284.93,122.19 288.00,133.45 291.07,146.16 294.14,147.62 297.21,163.47 300.28,172.64 303.35,165.34 306.42,154.50 309.49,179.72 312.56,168.05 315.62,180.14 318.69,188.90 321.76,175.97 324.83,207.03 327.90,192.65 330.97,209.12 334.04,196.82 337.11,200.36 340.18,203.49 343.25,215.16 346.32,222.46 349.39,218.29 352.46,198.69 355.53,230.59 358.60,230.79 361.67,247.47 364.74,264.35 367.81,243.30 370.88,242.88 373.95,253.10 377.02,265.19 380.09,255.60 383.16,255.81 386.23,271.86 389.30,282.28 392.36,275.82 395.43,271.23 398.50,284.78 401.57,285.82 404.64,300.62 407.71,301.67 410.78,299.16 413.85,302.08 416.92,314.80 419.99,324.18 423.06,330.22 426.13,319.18 429.20,339.60 432.27,337.10 435.34,349.19 438.41,340.02 441.48,347.52 444.55,355.24 447.62,359.61 450.69,357.53 453.76,362.32 456.83,355.86 459.90,360.24 462.97,363.16 466.04,369.20 469.11,377.33 472.17,368.79 475.24,380.88 478.31,372.33 481.38,384.84 484.45,381.50 487.52,397.76 490.59,377.96 493.66,386.71 496.73,379.83 499.80,390.88 502.87,392.76 505.94,394.43 509.01,402.76 512.08,406.10 515.15,411.73 518.22,394.01 521.29,405.26 524.36,408.18 527.43,412.14 530.50,422.15 533.57,422.77 536.64,412.77 539.71,426.53 542.78,414.44 545.85,419.44 548.92,438.62 551.98,434.66 555.05,444.24 558.12,432.57 561.19,445.29 564.26,435.07 567.33,452.58 570.40,443.83 573.47,440.08 576.54,448.62 579.61,448.20 582.68,459.46 585.75,457.38 588.82,464.46 591.89,466.97 594.96,466.13 598.03,477.80 601.10,463.21 604.17,472.59 607.24,471.13 610.31,475.09 613.38,480.51 616.45,480.93 619.52,473.84 622.59,489.69 625.66,480.93 628.72,481.35 631.79,491.98 634.86,483.64 637.93,493.65 641.00,483.85 644.07,502.82 647.14,493.23 650.21,498.23 653.28,494.06 656.35,490.31 659.42,501.36 662.49,503.03 665.56,501.98 668.63,508.24 671.70,503.44 674.77,508.86 677.84,504.28 680.91,506.36 683.98,511.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,111.14 76.19,126.57 79.26,143.25 82.33,114.69 85.40,116.36 88.47,116.15 91.54,110.31 94.61,127.61 97.68,98.64 100.75,92.59 103.82,124.07 106.89,114.27 109.96,108.02 113.03,113.85 116.10,110.94 119.17,126.57 122.24,103.22 125.31,101.76 128.38,86.55 131.45,97.60 134.52,85.71 137.59,103.02 140.66,89.26 143.73,111.14 146.80,110.94 149.87,98.64 152.94,107.39 156.00,108.64 159.07,95.30 162.14,87.80 165.21,75.71 168.28,91.34 171.35,77.58 174.42,77.17 177.49,102.60 180.56,65.08 183.63,85.51 186.70,60.49 189.77,74.25 192.84,68.20 195.91,77.38 198.98,66.12 202.05,85.92 205.12,87.38 208.19,90.30 211.26,72.79 214.33,90.09 217.40,80.92 220.47,84.67 223.54,101.14 226.61,79.04 229.68,81.34 232.75,96.34 235.81,105.93 238.88,107.39 241.95,94.47 245.02,101.76 248.09,96.34 251.16,102.60 254.23,117.81 257.30,107.18 260.37,101.97 263.44,116.36 266.51,129.07 269.58,109.27 272.65,139.08 275.72,148.46 278.79,124.69 281.86,140.54 284.93,131.57 288.00,147.41 291.07,144.08 294.14,145.12 297.21,171.39 300.28,153.25 303.35,170.97 306.42,160.76 309.49,186.39 312.56,175.56 315.62,182.02 318.69,188.06 321.76,181.81 324.83,198.69 327.90,184.10 330.97,189.73 334.04,203.28 337.11,209.95 340.18,221.62 343.25,223.91 346.32,221.00 349.39,233.09 352.46,240.38 355.53,219.33 358.60,231.84 361.67,230.17 364.74,241.63 367.81,253.72 370.88,242.05 373.95,246.84 377.02,245.80 380.09,261.44 383.16,271.65 386.23,273.53 389.30,290.41 392.36,278.11 395.43,283.53 398.50,286.87 401.57,289.78 404.64,301.46 407.71,301.04 410.78,316.26 413.85,326.26 416.92,313.13 419.99,304.79 423.06,314.80 426.13,323.34 429.20,327.51 432.27,332.93 435.34,344.19 438.41,346.07 441.48,341.90 444.55,343.77 447.62,350.44 450.69,355.86 453.76,358.16 456.83,356.90 459.90,365.24 462.97,357.53 466.04,380.67 469.11,370.45 472.17,378.37 475.24,369.20 478.31,368.79 481.38,382.13 484.45,383.59 487.52,390.88 490.59,388.38 493.66,389.01 496.73,399.43 499.80,400.26 502.87,407.77 505.94,396.93 509.01,411.10 512.08,405.26 515.15,403.81 518.22,416.31 521.29,411.10 524.36,420.06 527.43,411.52 530.50,420.06 533.57,412.14 536.64,431.95 539.71,431.32 542.78,424.23 545.85,444.87 548.92,431.53 551.98,434.66 555.05,435.49 558.12,438.41 561.19,438.41 564.26,437.78 567.33,433.82 570.40,448.00 573.47,453.62 576.54,447.58 579.61,455.29 582.68,460.92 585.75,458.42 588.82,461.13 591.89,468.84 594.96,469.68 598.03,466.34 601.10,464.26 604.17,471.97 607.24,469.47 610.31,474.89 613.38,477.60 616.45,481.77 619.52,495.11 622.59,484.06 625.66,490.94 628.72,479.89 631.79,488.02 634.86,487.18 637.93,485.31 641.00,494.27 644.07,490.94 647.14,499.48 650.21,497.19 653.28,505.95 656.35,496.77 659.42,500.53 662.49,504.49 665.56,501.36 668.63,500.11 671.70,504.07 674.77,505.95 677.84,500.32 680.91,517.41 683.98,510.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,138.03 76.19,135.32 79.26,141.58 82.33,137.41 85.40,137.62 88.47,108.02 91.54,121.98 94.61,119.90 97.68,112.40 100.75,97.60 103.82,115.52 106.89,104.68 109.96,107.18 113.03,91.34 116.10,113.23 119.17,94.05 122.24,113.65 125.31,105.10 128.38,104.47 131.45,109.06 134.52,109.89 137.59,96.34 140.66,101.56 143.73,113.02 146.80,96.34 149.87,96.34 152.94,100.51 156.00,101.35 159.07,85.92 162.14,97.18 165.21,78.21 168.28,83.63 171.35,94.68 174.42,113.85 177.49,101.97 180.56,83.42 183.63,82.80 186.70,89.67 189.77,83.21 192.84,74.04 195.91,100.51 198.98,90.51 202.05,92.18 205.12,86.13 208.19,89.05 211.26,85.51 214.33,88.22 217.40,97.18 220.47,96.34 223.54,65.70 226.61,93.63 229.68,100.10 232.75,101.97 235.81,77.58 238.88,80.50 241.95,95.09 245.02,101.56 248.09,102.18 251.16,103.22 254.23,122.40 257.30,114.69 260.37,110.31 263.44,126.36 266.51,122.82 269.58,125.74 272.65,120.73 275.72,131.57 278.79,128.45 281.86,159.09 284.93,155.96 288.00,137.62 291.07,147.21 294.14,150.96 297.21,154.92 300.28,152.42 303.35,165.34 306.42,162.42 309.49,173.47 312.56,189.52 315.62,189.94 318.69,173.89 321.76,177.64 324.83,189.94 327.90,203.49 330.97,200.78 334.04,206.61 337.11,204.32 340.18,201.40 343.25,217.45 346.32,219.33 349.39,223.71 352.46,228.50 355.53,240.80 358.60,217.66 361.67,251.64 364.74,246.64 367.81,247.05 370.88,253.72 373.95,263.31 377.02,264.77 380.09,270.19 383.16,262.89 386.23,276.03 389.30,276.65 392.36,285.62 395.43,286.87 398.50,277.90 401.57,293.33 404.64,302.71 407.71,307.29 410.78,322.30 413.85,313.34 416.92,315.22 419.99,319.18 423.06,329.81 426.13,315.84 429.20,322.09 432.27,332.31 435.34,345.44 438.41,337.31 441.48,345.65 444.55,342.31 447.62,345.02 450.69,354.19 453.76,355.45 456.83,350.86 459.90,352.94 462.97,360.03 466.04,371.50 469.11,367.95 472.17,371.91 475.24,364.83 478.31,373.79 481.38,388.59 484.45,382.54 487.52,385.25 490.59,384.42 493.66,388.17 496.73,389.63 499.80,390.88 502.87,399.01 505.94,401.93 509.01,404.43 512.08,405.89 515.15,400.68 518.22,414.85 521.29,409.64 524.36,415.27 527.43,425.48 530.50,421.32 533.57,410.89 536.64,434.03 539.71,432.99 542.78,427.57 545.85,430.49 548.92,429.03 551.98,436.95 555.05,435.49 558.12,445.08 561.19,449.66 564.26,452.37 567.33,434.03 570.40,441.12 573.47,454.46 576.54,457.59 579.61,451.75 582.68,449.25 585.75,451.96 588.82,467.80 591.89,467.17 594.96,465.51 598.03,473.43 601.10,466.13 604.17,471.13 607.24,477.39 610.31,473.43 613.38,475.51 616.45,477.39 619.52,481.35 622.59,484.89 625.66,486.77 628.72,479.26 631.79,493.44 634.86,491.35 637.93,503.44 641.00,498.86 644.07,486.77 647.14,494.48 650.21,487.18 653.28,497.19 656.35,491.98 659.42,501.57 662.49,506.36 665.56,498.23 668.63,500.73 671.70,490.31 674.77,505.32 677.84,504.49 680.91,499.27 683.98,504.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,133.87 76.19,135.32 79.26,115.52 82.33,104.27 85.40,117.81 88.47,130.11 91.54,128.24 94.61,91.76 97.68,110.10 100.75,116.15 103.82,111.77 106.89,106.77 109.96,118.65 113.03,112.40 116.10,101.14 119.17,111.56 122.24,106.14 125.31,116.77 128.38,93.01 131.45,121.57 134.52,95.93 137.59,118.86 140.66,105.10 143.73,111.14 146.80,102.81 149.87,97.80 152.94,125.74 156.00,95.93 159.07,80.71 162.14,66.54 165.21,97.18 168.28,87.38 171.35,96.14 174.42,96.34 177.49,76.54 180.56,89.47 183.63,73.42 186.70,82.17 189.77,83.84 192.84,86.34 195.91,74.04 198.98,78.00 202.05,78.84 205.12,93.22 208.19,79.46 211.26,64.66 214.33,68.00 217.40,97.60 220.47,83.42 223.54,107.81 226.61,73.21 229.68,98.22 232.75,106.35 235.81,103.22 238.88,83.84 241.95,98.64 245.02,95.09 248.09,100.93 251.16,121.98 254.23,111.98 257.30,117.40 260.37,130.11 263.44,124.90 266.51,135.32 269.58,129.49 272.65,116.56 275.72,126.15 278.79,129.07 281.86,134.49 284.93,146.37 288.00,141.79 291.07,147.62 294.14,149.92 297.21,157.63 300.28,143.25 303.35,169.09 306.42,171.59 309.49,187.64 312.56,178.26 315.62,181.18 318.69,213.28 321.76,205.36 324.83,199.11 327.90,190.56 330.97,211.20 334.04,213.08 337.11,216.41 340.18,215.58 343.25,210.37 346.32,219.12 349.39,210.57 352.46,236.42 355.53,232.04 358.60,243.51 361.67,247.05 364.74,243.09 367.81,267.69 370.88,261.44 373.95,267.06 377.02,260.39 380.09,257.68 383.16,272.48 386.23,265.60 389.30,272.07 392.36,276.44 395.43,262.27 398.50,299.79 401.57,287.49 404.64,300.21 407.71,312.92 410.78,302.29 413.85,313.34 416.92,304.38 419.99,324.60 423.06,335.43 426.13,326.26 429.20,317.92 432.27,342.52 435.34,334.60 438.41,356.90 441.48,313.55 444.55,353.99 447.62,344.61 450.69,364.20 453.76,360.24 456.83,365.66 459.90,367.54 462.97,353.57 466.04,357.11 469.11,377.96 472.17,390.67 475.24,373.16 478.31,386.92 481.38,386.09 484.45,377.75 487.52,395.68 490.59,386.92 493.66,384.21 496.73,390.46 499.80,391.92 502.87,409.02 505.94,405.47 509.01,404.64 512.08,405.68 515.15,408.81 518.22,402.76 521.29,421.73 524.36,416.73 527.43,422.77 530.50,411.31 533.57,415.90 536.64,424.86 539.71,423.19 542.78,430.70 545.85,429.03 548.92,422.98 551.98,431.11 555.05,419.86 558.12,440.91 561.19,447.16 564.26,440.28 567.33,450.91 570.40,442.37 573.47,450.08 576.54,451.54 579.61,455.71 582.68,452.58 585.75,474.26 588.82,466.34 591.89,449.66 594.96,456.13 598.03,472.38 601.10,456.75 604.17,463.63 607.24,468.84 610.31,473.01 613.38,473.84 616.45,476.35 619.52,478.43 622.59,475.30 625.66,480.93 628.72,481.35 631.79,487.81 634.86,491.98 637.93,489.69 641.00,495.94 644.07,490.73 647.14,485.73 650.21,503.65 653.28,495.31 656.35,503.03 659.42,505.74 662.49,503.24 665.56,498.65 668.63,516.99 671.70,505.53 674.77,516.37 677.84,511.16 680.91,515.74 683.98,508.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,113.02 76.19,138.03 79.26,131.99 82.33,126.99 85.40,127.40 88.47,120.52 91.54,112.40 94.61,113.02 97.68,105.10 100.75,129.07 103.82,124.07 106.89,119.27 109.96,100.72 113.03,117.19 116.10,113.02 119.17,95.09 122.24,107.60 125.31,108.85 128.38,96.55 131.45,109.48 134.52,85.51 137.59,103.22 140.66,98.01 143.73,93.43 146.80,94.05 149.87,80.92 152.94,79.46 156.00,95.93 159.07,82.17 162.14,85.71 165.21,83.84 168.28,83.00 171.35,79.04 174.42,77.79 177.49,75.92 180.56,87.59 183.63,93.43 186.70,73.83 189.77,91.97 192.84,74.87 195.91,81.96 198.98,85.92 202.05,74.04 205.12,86.96 208.19,87.17 211.26,73.62 214.33,94.68 217.40,103.22 220.47,103.02 223.54,100.10 226.61,98.22 229.68,109.27 232.75,78.63 235.81,110.10 238.88,96.34 241.95,122.40 245.02,111.77 248.09,85.51 251.16,101.14 254.23,110.52 257.30,105.31 260.37,144.08 263.44,131.99 266.51,116.77 269.58,127.82 272.65,121.57 275.72,136.78 278.79,143.45 281.86,136.16 284.93,145.96 288.00,156.38 291.07,145.96 294.14,154.50 297.21,144.08 300.28,151.38 303.35,184.31 306.42,172.64 309.49,171.59 312.56,183.68 315.62,170.14 318.69,189.10 321.76,184.94 324.83,180.56 327.90,199.32 330.97,218.91 334.04,209.32 337.11,218.08 340.18,202.86 343.25,224.33 346.32,222.25 349.39,237.88 352.46,230.17 355.53,239.13 358.60,242.68 361.67,235.17 364.74,238.92 367.81,246.84 370.88,258.73 373.95,253.72 377.02,266.86 380.09,254.97 383.16,278.53 386.23,270.19 389.30,277.28 392.36,285.41 395.43,283.95 398.50,288.12 401.57,302.29 404.64,299.16 407.71,305.42 410.78,308.96 413.85,321.68 416.92,324.18 419.99,322.72 423.06,330.22 426.13,315.01 429.20,342.31 432.27,330.85 435.34,342.73 438.41,339.19 441.48,357.32 444.55,346.07 447.62,354.19 450.69,354.40 453.76,350.23 456.83,351.28 459.90,366.49 462.97,369.83 466.04,365.24 469.11,386.30 472.17,367.95 475.24,376.08 478.31,380.46 481.38,382.75 484.45,386.92 487.52,402.14 490.59,377.75 493.66,390.67 496.73,392.34 499.80,380.25 502.87,393.38 505.94,397.76 509.01,396.51 512.08,404.85 515.15,405.06 518.22,416.94 521.29,417.15 524.36,406.72 527.43,420.90 530.50,413.19 533.57,419.44 536.64,418.19 539.71,420.48 542.78,422.36 545.85,432.57 548.92,425.90 551.98,432.78 555.05,433.20 558.12,436.74 561.19,451.75 564.26,439.45 567.33,444.45 570.40,446.75 573.47,445.08 576.54,453.00 579.61,456.96 582.68,451.12 585.75,469.47 588.82,469.05 591.89,466.76 594.96,464.67 598.03,470.51 601.10,473.01 604.17,470.09 607.24,473.01 610.31,475.72 613.38,475.09 616.45,473.01 619.52,486.35 622.59,484.06 625.66,484.47 628.72,481.14 631.79,490.73 634.86,486.98 637.93,493.65 641.00,494.27 644.07,496.15 647.14,494.90 650.21,500.53 653.28,505.95 656.35,501.57 659.42,499.69 662.49,505.74 665.56,504.69 668.63,506.99 671.70,514.49 674.77,511.99 677.84,509.91 680.91,501.36 683.98,498.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,141.58 76.19,134.49 79.26,142.83 82.33,134.28 85.40,134.49 88.47,128.24 91.54,149.92 94.61,107.81 97.68,116.77 100.75,116.15 103.82,112.60 106.89,106.98 109.96,119.07 113.03,99.05 116.10,88.01 119.17,110.94 122.24,117.81 125.31,102.60 128.38,121.78 131.45,109.48 134.52,97.18 137.59,108.85 140.66,114.06 143.73,92.38 146.80,111.56 149.87,92.59 152.94,104.27 156.00,77.79 159.07,81.54 162.14,99.68 165.21,75.08 168.28,72.58 171.35,80.09 174.42,59.87 177.49,74.87 180.56,77.58 183.63,88.22 186.70,70.29 189.77,95.51 192.84,94.89 195.91,73.62 198.98,83.00 202.05,93.22 205.12,93.63 208.19,74.25 211.26,80.29 214.33,70.29 217.40,77.79 220.47,65.49 223.54,84.05 226.61,85.92 229.68,99.68 232.75,99.26 235.81,101.35 238.88,98.22 241.95,114.27 245.02,80.50 248.09,91.76 251.16,104.89 254.23,108.43 257.30,86.55 260.37,106.14 263.44,94.26 266.51,114.27 269.58,120.52 272.65,116.15 275.72,140.74 278.79,120.11 281.86,136.78 284.93,150.96 288.00,141.37 291.07,125.74 294.14,165.76 297.21,158.05 300.28,147.21 303.35,165.76 306.42,178.68 309.49,177.43 312.56,171.80 315.62,178.47 318.69,208.91 321.76,180.97 324.83,197.65 327.90,191.40 330.97,174.51 334.04,207.45 337.11,207.66 340.18,218.08 343.25,213.70 346.32,218.29 349.39,223.29 352.46,231.00 355.53,236.84 358.60,228.29 361.67,238.09 364.74,239.55 367.81,259.14 370.88,246.64 373.95,262.69 377.02,263.31 380.09,264.98 383.16,259.35 386.23,276.03 389.30,272.90 392.36,283.74 395.43,279.99 398.50,303.54 401.57,310.42 404.64,274.78 407.71,306.04 410.78,316.67 413.85,310.00 416.92,307.09 419.99,333.98 423.06,325.43 426.13,332.52 429.20,327.51 432.27,337.94 435.34,349.61 438.41,350.65 441.48,336.69 444.55,349.19 447.62,362.95 450.69,367.74 453.76,364.83 456.83,363.37 459.90,369.83 462.97,366.08 466.04,377.33 469.11,363.37 472.17,388.59 475.24,375.67 478.31,384.21 481.38,388.17 484.45,397.34 487.52,385.05 490.59,395.68 493.66,396.72 496.73,397.97 499.80,402.76 502.87,388.38 505.94,398.39 509.01,402.35 512.08,398.18 515.15,391.92 518.22,405.89 521.29,409.85 524.36,423.61 527.43,421.32 530.50,414.64 533.57,424.86 536.64,423.82 539.71,419.44 542.78,427.36 545.85,416.94 548.92,434.45 551.98,449.46 555.05,439.24 558.12,441.12 561.19,436.32 564.26,445.50 567.33,444.66 570.40,451.54 573.47,448.20 576.54,455.71 579.61,449.46 582.68,455.08 585.75,450.71 588.82,467.80 591.89,462.38 594.96,462.80 598.03,467.38 601.10,468.42 604.17,473.43 607.24,466.55 610.31,479.06 613.38,482.18 616.45,483.02 619.52,485.93 622.59,485.10 625.66,483.85 628.72,489.89 631.79,488.44 634.86,495.31 637.93,492.60 641.00,494.90 644.07,494.48 647.14,492.81 650.21,500.11 653.28,499.48 656.35,504.07 659.42,500.73 662.49,502.19 665.56,499.48 668.63,505.53 671.70,510.74 674.77,500.32 677.84,510.74 680.91,508.65 683.98,504.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,154.92 76.19,147.00 79.26,132.61 82.33,145.12 85.40,118.86 88.47,117.40 91.54,116.15 94.61,132.61 97.68,104.89 100.75,109.27 103.82,104.27 106.89,108.64 109.96,115.31 113.03,98.64 116.10,96.34 119.17,107.18 122.24,103.02 125.31,107.39 128.38,103.43 131.45,106.77 134.52,115.52 137.59,119.69 140.66,97.60 143.73,98.22 146.80,100.93 149.87,87.80 152.94,94.89 156.00,71.33 159.07,89.67 162.14,88.84 165.21,70.08 168.28,76.33 171.35,75.92 174.42,88.22 177.49,84.25 180.56,84.88 183.63,73.00 186.70,88.22 189.77,80.92 192.84,88.01 195.91,62.16 198.98,78.84 202.05,85.30 205.12,81.34 208.19,62.16 211.26,85.92 214.33,88.22 217.40,88.01 220.47,89.47 223.54,87.59 226.61,101.35 229.68,88.42 232.75,86.76 235.81,103.02 238.88,92.80 241.95,107.60 245.02,103.85 248.09,115.73 251.16,112.81 254.23,104.06 257.30,133.03 260.37,115.73 263.44,121.15 266.51,127.82 269.58,122.19 272.65,128.45 275.72,115.11 278.79,151.17 281.86,132.61 284.93,143.66 288.00,146.37 291.07,139.29 294.14,154.08 297.21,162.84 300.28,148.46 303.35,173.05 306.42,179.72 309.49,195.98 312.56,182.85 315.62,174.51 318.69,191.19 321.76,179.10 324.83,191.61 327.90,186.81 330.97,202.65 334.04,208.91 337.11,193.69 340.18,230.79 343.25,219.75 346.32,230.17 349.39,226.42 352.46,225.37 355.53,236.42 358.60,232.88 361.67,252.47 364.74,259.35 367.81,254.77 370.88,259.98 373.95,261.44 377.02,251.64 380.09,269.15 383.16,276.24 386.23,270.61 389.30,268.31 392.36,279.36 395.43,300.83 398.50,296.87 401.57,282.70 404.64,292.08 407.71,302.08 410.78,305.42 413.85,307.50 416.92,302.71 419.99,317.92 423.06,318.97 426.13,308.96 429.20,329.81 432.27,333.35 435.34,336.69 438.41,343.77 441.48,345.86 444.55,345.86 447.62,350.86 450.69,351.28 453.76,359.82 456.83,357.74 459.90,373.79 462.97,356.90 466.04,378.79 469.11,368.58 472.17,381.71 475.24,376.92 478.31,379.63 481.38,375.04 484.45,375.67 487.52,386.71 490.59,385.67 493.66,382.75 496.73,395.47 499.80,404.64 502.87,388.38 505.94,401.30 509.01,406.10 512.08,404.43 515.15,407.77 518.22,415.06 521.29,411.52 524.36,429.86 527.43,417.98 530.50,417.98 533.57,420.69 536.64,426.11 539.71,423.82 542.78,418.40 545.85,427.36 548.92,434.03 551.98,445.91 555.05,449.46 558.12,444.87 561.19,432.99 564.26,448.83 567.33,448.20 570.40,455.08 573.47,454.04 576.54,446.75 579.61,455.29 582.68,452.58 585.75,459.04 588.82,466.55 591.89,468.22 594.96,466.76 598.03,458.63 601.10,476.14 604.17,479.68 607.24,471.97 610.31,476.14 613.38,480.31 616.45,470.51 619.52,478.85 622.59,464.05 625.66,477.80 628.72,485.52 631.79,494.69 634.86,489.48 637.93,483.43 641.00,489.06 644.07,485.31 647.14,473.64 650.21,485.31 653.28,499.69 656.35,492.40 659.42,490.73 662.49,500.32 665.56,506.78 668.63,495.52 671.70,501.98 674.77,504.69 677.84,510.95 680.91,508.45 683.98,512.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,151.58 76.19,150.12 79.26,144.70 82.33,129.49 85.40,108.64 88.47,106.56 91.54,115.31 94.61,131.57 97.68,107.39 100.75,123.86 103.82,115.31 106.89,123.44 109.96,115.94 113.03,108.02 116.10,84.46 119.17,101.14 122.24,101.76 125.31,113.44 128.38,94.68 131.45,97.18 134.52,106.35 137.59,99.26 140.66,103.85 143.73,104.06 146.80,95.09 149.87,90.72 152.94,103.43 156.00,91.97 159.07,99.26 162.14,95.72 165.21,95.30 168.28,89.05 171.35,89.47 174.42,85.71 177.49,94.26 180.56,75.08 183.63,87.80 186.70,84.67 189.77,78.21 192.84,75.71 195.91,94.89 198.98,93.22 202.05,87.59 205.12,88.84 208.19,60.70 211.26,96.55 214.33,92.59 217.40,93.43 220.47,90.72 223.54,80.50 226.61,90.72 229.68,106.77 232.75,83.63 235.81,103.02 238.88,110.94 241.95,113.44 245.02,104.06 248.09,134.28 251.16,110.52 254.23,100.72 257.30,126.57 260.37,123.03 263.44,133.66 266.51,116.98 269.58,128.24 272.65,140.74 275.72,114.69 278.79,123.65 281.86,138.45 284.93,143.45 288.00,125.32 291.07,150.12 294.14,143.87 297.21,125.53 300.28,139.29 303.35,160.34 306.42,161.59 309.49,177.22 312.56,182.02 315.62,169.93 318.69,183.06 321.76,193.48 324.83,199.94 327.90,182.85 330.97,193.69 334.04,218.08 337.11,223.91 340.18,217.24 343.25,212.66 346.32,204.32 349.39,214.12 352.46,224.54 355.53,226.83 358.60,246.01 361.67,257.89 364.74,251.85 367.81,251.43 370.88,244.34 373.95,260.81 377.02,260.39 380.09,259.77 383.16,272.69 386.23,271.65 389.30,283.74 392.36,279.36 395.43,274.36 398.50,289.78 401.57,280.40 404.64,311.46 407.71,308.13 410.78,317.72 413.85,325.64 416.92,310.63 419.99,327.10 423.06,321.05 426.13,325.22 429.20,329.18 432.27,337.31 435.34,334.18 438.41,331.89 441.48,341.06 444.55,349.19 447.62,362.12 450.69,365.45 453.76,356.70 456.83,360.03 459.90,358.99 462.97,357.53 466.04,366.08 469.11,362.74 472.17,380.25 475.24,387.55 478.31,382.34 481.38,380.46 484.45,391.51 487.52,390.88 490.59,391.09 493.66,387.13 496.73,403.18 499.80,407.97 502.87,398.59 505.94,411.73 509.01,412.14 512.08,416.10 515.15,411.52 518.22,425.28 521.29,415.48 524.36,423.61 527.43,425.48 530.50,431.11 533.57,425.48 536.64,435.91 539.71,426.73 542.78,423.40 545.85,435.49 548.92,437.57 551.98,447.79 555.05,433.61 558.12,430.28 561.19,442.16 564.26,440.28 567.33,441.53 570.40,447.58 573.47,452.17 576.54,458.63 579.61,444.66 582.68,455.50 585.75,463.00 588.82,471.55 591.89,460.50 594.96,461.75 598.03,466.34 601.10,470.30 604.17,470.09 607.24,471.34 610.31,478.64 613.38,483.43 616.45,474.47 619.52,480.51 622.59,484.06 625.66,480.51 628.72,488.85 631.79,493.65 634.86,483.22 637.93,497.19 641.00,492.60 644.07,494.27 647.14,488.23 650.21,491.98 653.28,496.77 656.35,494.90 659.42,498.02 662.49,504.90 665.56,503.44 668.63,504.49 671.70,499.48 674.77,509.70 677.84,499.69 680.91,508.86 683.98,514.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,117.19 76.19,114.48 79.26,128.86 82.33,118.23 85.40,105.93 88.47,130.74 91.54,120.11 94.61,131.57 97.68,105.31 100.75,121.36 103.82,117.40 106.89,98.85 109.96,103.43 113.03,108.02 116.10,110.73 119.17,126.15 122.24,113.44 125.31,96.55 128.38,117.40 131.45,94.05 134.52,99.26 137.59,107.60 140.66,96.55 143.73,116.56 146.80,88.63 149.87,94.05 152.94,81.75 156.00,119.27 159.07,67.79 162.14,101.97 165.21,96.55 168.28,90.51 171.35,90.93 174.42,94.26 177.49,77.38 180.56,80.50 183.63,101.35 186.70,69.25 189.77,86.34 192.84,82.17 195.91,85.51 198.98,77.38 202.05,74.25 205.12,68.41 208.19,78.63 211.26,85.51 214.33,66.75 217.40,69.87 220.47,91.13 223.54,107.81 226.61,89.67 229.68,79.04 232.75,105.52 235.81,108.23 238.88,106.98 241.95,88.63 245.02,132.61 248.09,116.56 251.16,99.26 254.23,116.15 257.30,116.15 260.37,118.44 263.44,111.14 266.51,122.40 269.58,120.32 272.65,149.08 275.72,161.80 278.79,138.03 281.86,134.49 284.93,138.45 288.00,151.17 291.07,151.17 294.14,144.29 297.21,153.46 300.28,155.96 303.35,163.05 306.42,189.94 309.49,185.14 312.56,180.77 315.62,173.05 318.69,175.56 321.76,192.44 324.83,190.98 327.90,187.23 330.97,203.28 334.04,215.37 337.11,213.70 340.18,217.66 343.25,222.66 346.32,236.21 349.39,218.08 352.46,215.37 355.53,237.05 358.60,254.77 361.67,235.17 364.74,261.44 367.81,239.34 370.88,248.93 373.95,267.06 377.02,255.39 380.09,281.86 383.16,273.53 386.23,268.31 389.30,280.40 392.36,275.19 395.43,294.16 398.50,289.78 401.57,291.87 404.64,296.45 407.71,320.43 410.78,301.46 413.85,314.38 416.92,320.01 419.99,312.92 423.06,326.47 426.13,333.35 429.20,331.47 432.27,328.56 435.34,351.07 438.41,327.93 441.48,331.47 444.55,361.70 447.62,357.32 450.69,372.54 453.76,370.66 456.83,362.74 459.90,371.70 462.97,363.99 466.04,365.24 469.11,368.99 472.17,377.96 475.24,368.79 478.31,379.83 481.38,383.79 484.45,383.17 487.52,383.17 490.59,390.46 493.66,395.05 496.73,394.22 499.80,387.76 502.87,401.51 505.94,394.63 509.01,417.98 512.08,414.64 515.15,412.98 518.22,419.65 521.29,416.31 524.36,417.77 527.43,416.31 530.50,428.19 533.57,419.23 536.64,424.65 539.71,432.78 542.78,424.65 545.85,437.78 548.92,427.36 551.98,437.57 555.05,443.83 558.12,451.96 561.19,440.70 564.26,445.50 567.33,447.79 570.40,456.54 573.47,460.50 576.54,449.66 579.61,444.24 582.68,459.67 585.75,462.17 588.82,467.80 591.89,468.63 594.96,469.47 598.03,464.88 601.10,476.35 604.17,469.05 607.24,480.72 610.31,475.72 613.38,477.39 616.45,480.51 619.52,486.98 622.59,483.43 625.66,482.81 628.72,484.27 631.79,487.81 634.86,494.06 637.93,493.02 641.00,494.06 644.07,502.19 647.14,496.36 650.21,489.06 653.28,496.56 656.35,500.94 659.42,493.86 662.49,509.07 665.56,498.44 668.63,495.11 671.70,509.91 674.77,500.53 677.84,501.36 680.91,513.87 683.98,506.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,146.37 76.19,110.10 79.26,121.15 82.33,124.90 85.40,130.95 88.47,118.86 91.54,134.91 94.61,123.23 97.68,116.56 100.75,104.89 103.82,115.94 106.89,114.48 109.96,108.43 113.03,103.64 116.10,114.69 119.17,113.02 122.24,112.60 125.31,103.64 128.38,109.69 131.45,104.89 134.52,90.51 137.59,91.34 140.66,94.05 143.73,112.19 146.80,90.30 149.87,94.26 152.94,107.39 156.00,106.77 159.07,90.72 162.14,101.97 165.21,79.88 168.28,78.21 171.35,87.38 174.42,83.63 177.49,94.26 180.56,93.63 183.63,88.84 186.70,83.21 189.77,87.59 192.84,90.93 195.91,77.79 198.98,78.84 202.05,70.29 205.12,81.54 208.19,90.51 211.26,109.48 214.33,108.43 217.40,99.26 220.47,86.76 223.54,104.68 226.61,86.55 229.68,100.10 232.75,92.59 235.81,89.88 238.88,96.97 241.95,106.98 245.02,97.80 248.09,94.05 251.16,104.47 254.23,103.85 257.30,121.57 260.37,125.53 263.44,118.65 266.51,109.06 269.58,128.45 272.65,113.44 275.72,133.24 278.79,136.16 281.86,138.45 284.93,138.03 288.00,145.75 291.07,141.58 294.14,145.75 297.21,165.76 300.28,143.66 303.35,163.88 306.42,190.98 309.49,177.43 312.56,175.56 315.62,189.73 318.69,192.44 321.76,198.07 324.83,187.64 327.90,199.32 330.97,203.90 334.04,205.57 337.11,211.41 340.18,226.21 343.25,204.32 346.32,238.30 349.39,235.59 352.46,243.72 355.53,222.87 358.60,245.59 361.67,257.89 364.74,252.47 367.81,259.98 370.88,252.47 373.95,262.48 377.02,252.26 380.09,267.27 383.16,288.53 386.23,272.07 389.30,274.15 392.36,285.82 395.43,280.82 398.50,292.70 401.57,292.49 404.64,297.71 407.71,301.46 410.78,309.38 413.85,311.88 416.92,327.93 419.99,317.92 423.06,318.34 426.13,315.01 429.20,320.63 432.27,324.39 435.34,344.19 438.41,334.81 441.48,341.27 444.55,346.90 447.62,332.10 450.69,363.37 453.76,354.82 456.83,357.32 459.90,362.74 462.97,358.99 466.04,368.99 469.11,357.74 472.17,380.46 475.24,365.87 478.31,368.16 481.38,381.08 484.45,385.25 487.52,392.97 490.59,386.09 493.66,396.93 496.73,392.13 499.80,371.91 502.87,386.92 505.94,400.05 509.01,412.35 512.08,407.14 515.15,413.39 518.22,419.44 521.29,420.27 524.36,420.06 527.43,425.07 530.50,414.64 533.57,423.82 536.64,421.32 539.71,427.99 542.78,443.20 545.85,425.48 548.92,427.57 551.98,438.41 555.05,438.82 558.12,438.41 561.19,436.74 564.26,442.16 567.33,451.12 570.40,451.96 573.47,456.75 576.54,453.21 579.61,457.59 582.68,443.62 585.75,459.46 588.82,461.75 591.89,462.59 594.96,468.22 598.03,459.88 601.10,459.67 604.17,476.76 607.24,469.68 610.31,469.68 613.38,488.64 616.45,481.77 619.52,477.80 622.59,478.43 625.66,480.72 628.72,487.60 631.79,489.89 634.86,499.48 637.93,498.44 641.00,488.23 644.07,496.56 647.14,495.31 650.21,489.89 653.28,499.69 656.35,489.06 659.42,502.61 662.49,503.65 665.56,510.53 668.63,500.73 671.70,506.78 674.77,499.69 677.84,501.78 680.91,509.91 683.98,499.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.13,129.07 76.19,123.23 79.26,115.73 82.33,136.99 85.40,129.07 88.47,118.86 91.54,135.53 94.61,113.65 97.68,114.06 100.75,139.91 103.82,124.07 106.89,115.52 109.96,133.45 113.03,125.53 116.10,111.56 119.17,109.89 122.24,88.63 125.31,103.02 128.38,99.05 131.45,92.80 134.52,114.48 137.59,84.25 140.66,100.51 143.73,101.97 146.80,83.21 149.87,88.84 152.94,103.43 156.00,106.35 159.07,85.92 162.14,90.30 165.21,112.81 168.28,98.85 171.35,80.29 174.42,77.17 177.49,84.88 180.56,82.38 183.63,99.05 186.70,71.75 189.77,66.54 192.84,69.04 195.91,97.18 198.98,90.72 202.05,83.63 205.12,76.33 208.19,88.22 211.26,81.54 214.33,116.15 217.40,98.64 220.47,85.30 223.54,83.84 226.61,90.93 229.68,73.62 232.75,91.13 235.81,82.80 238.88,69.45 241.95,98.01 245.02,95.51 248.09,98.85 251.16,119.69 254.23,101.56 257.30,94.68 260.37,102.81 263.44,122.19 266.51,107.60 269.58,117.19 272.65,142.41 275.72,129.07 278.79,151.38 281.86,142.62 284.93,123.03 288.00,145.33 291.07,150.75 294.14,148.87 297.21,160.55 300.28,166.59 303.35,184.10 306.42,161.17 309.49,191.61 312.56,184.31 315.62,190.77 318.69,175.97 321.76,185.98 324.83,195.77 327.90,208.49 330.97,224.96 334.04,204.32 337.11,202.24 340.18,221.62 343.25,220.37 346.32,222.66 349.39,213.49 352.46,236.42 355.53,219.95 358.60,238.09 361.67,230.17 364.74,233.50 367.81,256.22 370.88,251.43 373.95,250.60 377.02,267.69 380.09,266.44 383.16,264.15 386.23,271.44 389.30,271.23 392.36,281.66 395.43,288.12 398.50,300.00 401.57,283.95 404.64,312.09 407.71,302.29 410.78,305.21 413.85,306.88 416.92,309.59 419.99,310.84 423.06,324.60 426.13,335.02 429.20,331.06 432.27,321.68 435.34,334.81 438.41,345.02 441.48,341.69 444.55,333.98 447.62,358.16 450.69,359.41 453.76,354.61 456.83,357.11 459.90,361.49 462.97,361.70 466.04,370.45 469.11,361.49 472.17,382.34 475.24,377.12 478.31,376.08 481.38,393.80 484.45,379.42 487.52,376.29 490.59,387.34 493.66,387.76 496.73,391.30 499.80,392.13 502.87,398.39 505.94,398.59 509.01,402.14 512.08,403.60 515.15,399.43 518.22,405.06 521.29,401.72 524.36,413.60 527.43,409.85 530.50,414.23 533.57,417.98 536.64,421.32 539.71,423.82 542.78,427.36 545.85,430.28 548.92,436.53 551.98,421.11 555.05,423.19 558.12,448.00 561.19,446.12 564.26,437.99 567.33,454.46 570.40,449.87 573.47,451.54 576.54,456.33 579.61,470.30 582.68,464.26 585.75,459.46 588.82,462.80 591.89,468.84 594.96,474.05 598.03,468.84 601.10,474.47 604.17,469.26 607.24,470.93 610.31,480.72 613.38,491.35 616.45,478.64 619.52,493.02 622.59,480.51 625.66,479.47 628.72,485.93 631.79,500.32 634.86,485.10 637.93,494.48 641.00,496.56 644.07,489.69 647.14,498.23 650.21,496.15 653.28,496.15 656.35,496.36 659.42,503.65 662.49,502.61 665.56,503.03 668.63,503.65 671.70,508.03 674.77,501.57 677.84,515.53 680.91,504.49 683.98,506.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<rect x='42.58' y='22.78' width='671.94' height='522.33' style='stroke-width: 1.07; stroke: #333333;' /> +<g clip-path='url(#cpNDcuNDh8NzE0LjUyfDIyLjc4fDU0NS4xMQ==)'> +<rect x='47.48' y='22.78' width='667.04' height='522.33' style='stroke-width: 1.07; stroke: none; fill: #FFFFFF;' /> +<polyline points='47.48,464.93 714.52,464.93 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,342.02 714.52,342.02 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,219.11 714.52,219.11 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,96.21 714.52,96.21 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='57.24,545.11 57.24,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='201.13,545.11 201.13,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='345.03,545.11 345.03,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='504.34,545.11 504.34,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='663.64,545.11 663.64,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,526.38 714.52,526.38 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,403.48 714.52,403.48 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,280.57 714.52,280.57 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,157.66 714.52,157.66 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,34.75 714.52,34.75 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='129.19,545.11 129.19,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='273.08,545.11 273.08,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='416.97,545.11 416.97,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='591.70,545.11 591.70,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<circle cx='77.80' cy='513.75' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='88.08' cy='510.78' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='98.35' cy='499.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='108.63' cy='489.64' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='118.91' cy='494.50' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='129.19' cy='481.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='139.47' cy='497.16' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='149.74' cy='493.03' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='160.02' cy='494.94' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='170.30' cy='418.08' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='180.58' cy='431.38' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='190.86' cy='455.98' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='201.13' cy='447.40' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='211.41' cy='445.68' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='221.69' cy='453.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='231.97' cy='446.67' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='242.25' cy='354.63' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='252.52' cy='436.37' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='262.80' cy='333.17' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='273.08' cy='392.64' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='283.36' cy='403.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='293.64' cy='416.19' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='303.91' cy='459.20' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='314.19' cy='356.23' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='324.47' cy='375.97' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='334.75' cy='401.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='345.03' cy='452.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='355.30' cy='480.20' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='365.58' cy='443.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='375.86' cy='453.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='386.14' cy='295.71' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='396.42' cy='384.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='406.69' cy='401.02' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='416.97' cy='427.47' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='427.25' cy='476.98' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='437.53' cy='477.27' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='447.81' cy='480.52' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='458.08' cy='418.27' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='468.36' cy='388.16' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='478.64' cy='420.76' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='488.92' cy='474.35' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='499.20' cy='499.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='509.47' cy='472.77' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='519.75' cy='495.85' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='530.03' cy='415.13' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='540.31' cy='423.44' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='550.59' cy='442.14' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='560.86' cy='471.15' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='571.14' cy='464.71' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='581.42' cy='491.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='591.70' cy='516.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='601.98' cy='454.66' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='612.25' cy='469.36' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='622.53' cy='477.52' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='632.81' cy='458.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='643.09' cy='481.92' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='653.37' cy='489.32' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='663.64' cy='493.10' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='673.92' cy='403.60' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='684.20' cy='419.21' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<polyline points='77.80,511.24 88.08,513.48 98.35,446.15 108.63,489.19 118.91,492.88 129.19,483.54 139.47,513.97 149.74,481.89 160.02,478.45 170.30,463.41 180.58,445.27 190.86,467.00 201.13,362.18 211.41,410.90 221.69,443.35 231.97,451.66 242.25,388.53 252.52,395.22 262.80,336.88 273.08,409.38 283.36,446.08 293.64,450.28 303.91,473.66 314.19,296.05 324.47,469.08 334.75,395.93 345.03,453.94 355.30,442.56 365.58,476.90 375.86,479.04 386.14,363.38 396.42,378.28 406.69,430.59 416.97,413.60 427.25,478.55 437.53,460.95 447.81,454.80 458.08,396.30 468.36,438.09 478.64,456.67 488.92,466.23 499.20,473.49 509.47,499.49 519.75,494.94 530.03,448.98 540.31,434.42 550.59,468.99 560.86,467.56 571.14,488.23 581.42,486.12 591.70,497.70 601.98,458.47 612.25,461.64 622.53,462.94 632.81,468.79 643.09,479.11 653.37,492.39 663.64,509.42 673.92,408.56 684.20,441.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.14 88.08,515.45 98.35,499.10 108.63,501.21 118.91,493.84 129.19,488.41 139.47,499.79 149.74,496.15 160.02,485.60 170.30,400.97 180.58,404.14 190.86,427.22 201.13,420.76 211.41,445.07 221.69,452.64 231.97,470.34 242.25,338.83 252.52,392.19 262.80,322.38 273.08,345.07 283.36,438.92 293.64,453.03 303.91,431.70 314.19,315.40 324.47,328.75 334.75,308.12 345.03,330.76 355.30,417.09 365.58,348.46 375.86,454.53 386.14,459.94 396.42,405.57 406.69,422.33 416.97,441.18 427.25,437.08 437.53,440.35 447.81,480.22 458.08,398.71 468.36,400.08 478.64,408.42 488.92,456.03 499.20,484.79 509.47,448.68 519.75,487.57 530.03,446.15 540.31,439.00 550.59,457.63 560.86,446.76 571.14,479.09 581.42,480.74 591.70,495.53 601.98,415.87 612.25,462.33 622.53,479.02 632.81,467.09 643.09,471.99 653.37,479.70 663.64,495.85 673.92,407.07 684.20,468.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.42 88.08,521.37 98.35,478.13 108.63,480.25 118.91,492.19 129.19,498.34 139.47,495.95 149.74,502.86 160.02,500.65 170.30,441.58 180.58,487.18 190.86,422.38 201.13,480.79 211.41,451.88 221.69,457.19 231.97,485.70 242.25,300.82 252.52,379.85 262.80,299.32 273.08,384.97 283.36,488.70 293.64,455.42 303.91,423.68 314.19,286.37 324.47,339.47 334.75,242.91 345.03,423.85 355.30,425.72 365.58,484.67 375.86,446.84 386.14,394.58 396.42,367.88 406.69,425.26 416.97,426.85 427.25,478.52 437.53,440.77 447.81,464.14 458.08,402.39 468.36,448.09 478.64,435.51 488.92,481.40 499.20,478.35 509.47,494.82 519.75,477.91 530.03,421.86 540.31,434.15 550.59,468.94 560.86,484.13 571.14,484.23 581.42,498.41 591.70,496.05 601.98,397.40 612.25,470.22 622.53,449.64 632.81,474.89 643.09,472.08 653.37,465.84 663.64,479.43 673.92,382.63 684.20,428.38 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.59 88.08,515.52 98.35,473.44 108.63,453.48 118.91,484.13 129.19,481.72 139.47,491.11 149.74,470.31 160.02,492.71 170.30,419.16 180.58,426.51 190.86,445.41 201.13,466.65 211.41,463.65 221.69,459.82 231.97,451.93 242.25,351.71 252.52,426.04 262.80,408.81 273.08,438.06 283.36,457.80 293.64,454.48 303.91,465.13 314.19,448.63 324.47,433.54 334.75,420.17 345.03,431.65 355.30,467.09 365.58,475.99 375.86,482.56 386.14,312.89 396.42,460.56 406.69,367.78 416.97,454.66 427.25,493.96 437.53,455.02 447.81,467.63 458.08,316.48 468.36,357.88 478.64,431.79 488.92,469.21 499.20,459.55 509.47,448.83 519.75,482.68 530.03,436.66 540.31,472.43 550.59,480.91 560.86,493.54 571.14,505.27 581.42,503.75 591.70,498.61 601.98,458.96 612.25,459.47 622.53,487.67 632.81,484.01 643.09,497.50 653.37,479.68 663.64,486.56 673.92,392.81 684.20,433.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.81 88.08,509.84 98.35,498.90 108.63,466.06 118.91,500.38 129.19,504.34 139.47,487.84 149.74,493.77 160.02,488.92 170.30,424.42 180.58,430.25 190.86,424.84 201.13,461.86 211.41,449.25 221.69,471.94 231.97,480.07 242.25,281.18 252.52,385.80 262.80,389.59 273.08,414.34 283.36,435.19 293.64,438.95 303.91,454.56 314.19,209.08 324.47,423.22 334.75,447.08 345.03,425.53 355.30,453.89 365.58,414.24 375.86,504.14 386.14,347.16 396.42,402.64 406.69,449.47 416.97,406.79 427.25,446.62 437.53,471.40 447.81,508.78 458.08,353.50 468.36,409.25 478.64,427.71 488.92,408.22 499.20,458.29 509.47,470.81 519.75,497.48 530.03,436.59 540.31,426.90 550.59,477.96 560.86,467.91 571.14,485.70 581.42,461.05 591.70,507.46 601.98,432.14 612.25,442.14 622.53,451.24 632.81,482.58 643.09,485.70 653.37,464.59 663.64,509.79 673.92,387.13 684.20,453.06 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,498.68 88.08,503.84 98.35,482.68 108.63,479.38 118.91,465.30 129.19,469.38 139.47,479.31 149.74,493.32 160.02,490.40 170.30,415.69 180.58,462.74 190.86,463.65 201.13,438.23 211.41,472.13 221.69,428.13 231.97,445.54 242.25,392.56 252.52,326.68 262.80,354.02 273.08,426.68 283.36,420.39 293.64,402.25 303.91,488.28 314.19,390.35 324.47,351.83 334.75,376.56 345.03,378.11 355.30,429.68 365.58,486.17 375.86,458.64 386.14,341.58 396.42,383.12 406.69,393.23 416.97,439.78 427.25,495.22 437.53,449.86 447.81,486.39 458.08,388.16 468.36,418.25 478.64,442.36 488.92,466.14 499.20,471.47 509.47,470.61 519.75,486.44 530.03,445.12 540.31,461.24 550.59,487.40 560.86,455.49 571.14,491.50 581.42,472.65 591.70,507.24 601.98,418.72 612.25,438.31 622.53,468.37 632.81,475.80 643.09,478.06 653.37,485.04 663.64,489.00 673.92,448.88 684.20,466.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.26 88.08,514.66 98.35,491.55 108.63,478.79 118.91,481.55 129.19,491.01 139.47,505.86 149.74,481.45 160.02,481.33 170.30,412.74 180.58,427.15 190.86,431.30 201.13,401.71 211.41,461.61 221.69,455.42 231.97,442.68 242.25,360.97 252.52,344.95 262.80,365.57 273.08,406.62 283.36,447.28 293.64,454.21 303.91,473.93 314.19,231.33 324.47,414.83 334.75,417.56 345.03,428.87 355.30,443.18 365.58,464.49 375.86,458.44 386.14,239.93 396.42,275.58 406.69,423.73 416.97,431.28 427.25,455.42 437.53,453.33 447.81,472.92 458.08,379.24 468.36,411.02 478.64,450.77 488.92,478.62 499.20,488.97 509.47,456.82 519.75,486.19 530.03,368.42 540.31,468.05 550.59,459.18 560.86,476.24 571.14,500.97 581.42,501.90 591.70,482.24 601.98,426.29 612.25,459.52 622.53,479.61 632.81,448.12 643.09,497.85 653.37,501.68 663.64,491.23 673.92,307.95 684.20,462.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.80 88.08,516.43 98.35,509.23 108.63,479.26 118.91,481.87 129.19,500.72 139.47,505.12 149.74,506.13 160.02,503.87 170.30,477.49 180.58,487.74 190.86,440.89 201.13,405.42 211.41,419.13 221.69,467.54 231.97,461.98 242.25,250.80 252.52,298.91 262.80,242.34 273.08,310.02 283.36,449.25 293.64,406.06 303.91,433.07 314.19,336.66 324.47,381.80 334.75,345.51 345.03,381.25 355.30,435.80 365.58,429.71 375.86,478.77 386.14,368.20 396.42,447.92 406.69,328.94 416.97,405.39 427.25,461.07 437.53,451.07 447.81,481.74 458.08,463.41 468.36,413.97 478.64,443.42 488.92,460.36 499.20,452.49 509.47,466.92 519.75,471.59 530.03,453.72 540.31,469.21 550.59,424.99 560.86,451.19 571.14,483.34 581.42,486.56 591.70,510.55 601.98,485.24 612.25,455.69 622.53,459.89 632.81,491.28 643.09,488.28 653.37,493.22 663.64,477.86 673.92,435.97 684.20,390.60 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.09 88.08,518.35 98.35,488.18 108.63,473.68 118.91,507.04 129.19,476.07 139.47,500.67 149.74,505.83 160.02,508.32 170.30,435.78 180.58,449.81 190.86,451.61 201.13,447.35 211.41,471.00 221.69,484.69 231.97,437.65 242.25,313.34 252.52,275.18 262.80,377.08 273.08,386.93 283.36,437.33 293.64,410.90 303.91,415.96 314.19,433.32 324.47,406.23 334.75,435.38 345.03,416.85 355.30,456.99 365.58,442.66 375.86,473.34 386.14,402.57 396.42,395.24 406.69,420.59 416.97,463.97 427.25,497.23 437.53,496.91 447.81,489.59 458.08,433.39 468.36,455.37 478.64,502.54 488.92,446.25 499.20,481.13 509.47,481.35 519.75,494.80 530.03,450.18 540.31,470.81 550.59,477.34 560.86,490.10 571.14,503.45 581.42,502.52 591.70,502.79 601.98,460.38 612.25,442.19 622.53,481.65 632.81,475.35 643.09,481.03 653.37,501.58 663.64,502.76 673.92,435.51 684.20,498.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,489.54 88.08,510.33 98.35,476.46 108.63,491.82 118.91,478.03 129.19,487.57 139.47,489.19 149.74,501.51 160.02,493.35 170.30,386.86 180.58,434.03 190.86,465.00 201.13,447.45 211.41,462.77 221.69,427.79 231.97,444.50 242.25,316.09 252.52,370.91 262.80,419.43 273.08,435.83 283.36,434.50 293.64,415.05 303.91,438.31 314.19,363.83 324.47,282.29 334.75,369.75 345.03,432.26 355.30,427.52 365.58,427.30 375.86,480.32 386.14,321.59 396.42,421.79 406.69,399.52 416.97,419.95 427.25,458.00 437.53,433.20 447.81,464.98 458.08,445.02 468.36,455.57 478.64,466.04 488.92,453.77 499.20,475.77 509.47,477.74 519.75,506.33 530.03,439.49 540.31,453.60 550.59,473.17 560.86,464.76 571.14,481.65 581.42,493.94 591.70,504.34 601.98,455.59 612.25,384.60 622.53,461.17 632.81,442.12 643.09,491.50 653.37,502.98 663.64,488.16 673.92,424.89 684.20,423.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,512.82 88.08,513.97 98.35,500.84 108.63,492.31 118.91,493.57 129.19,477.07 139.47,493.42 149.74,487.77 160.02,500.23 170.30,474.57 180.58,424.94 190.86,484.08 201.13,424.49 211.41,466.75 221.69,449.25 231.97,479.58 242.25,414.24 252.52,398.41 262.80,429.04 273.08,395.27 283.36,437.84 293.64,416.80 303.91,449.99 314.19,362.15 324.47,393.94 334.75,373.78 345.03,408.61 355.30,415.55 365.58,499.62 375.86,475.08 386.14,378.72 396.42,397.21 406.69,452.49 416.97,445.02 427.25,448.36 437.53,485.14 447.81,477.07 458.08,424.69 468.36,395.29 478.64,428.80 488.92,474.86 499.20,473.73 509.47,497.18 519.75,486.32 530.03,456.77 540.31,429.24 550.59,463.97 560.86,470.02 571.14,486.10 581.42,490.54 591.70,492.51 601.98,477.74 612.25,449.81 622.53,466.48 632.81,467.54 643.09,485.75 653.37,502.88 663.64,483.83 673.92,441.01 684.20,443.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,512.82 88.08,518.91 98.35,477.49 108.63,456.30 118.91,482.75 129.19,480.79 139.47,482.85 149.74,486.61 160.02,508.66 170.30,415.67 180.58,441.31 190.86,472.80 201.13,472.82 211.41,474.17 221.69,462.05 231.97,466.68 242.25,360.21 252.52,373.98 262.80,417.56 273.08,441.41 283.36,458.56 293.64,446.81 303.91,457.53 314.19,375.18 324.47,406.40 334.75,448.90 345.03,417.49 355.30,472.43 365.58,486.88 375.86,479.19 386.14,361.79 396.42,403.57 406.69,374.89 416.97,477.05 427.25,479.75 437.53,472.99 447.81,484.60 458.08,405.03 468.36,383.37 478.64,430.64 488.92,490.91 499.20,462.67 509.47,473.56 519.75,494.01 530.03,421.20 540.31,433.66 550.59,446.08 560.86,465.42 571.14,485.48 581.42,483.34 591.70,510.73 601.98,467.24 612.25,453.30 622.53,414.71 632.81,482.29 643.09,473.19 653.37,478.23 663.64,490.13 673.92,416.36 684.20,429.73 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,498.36 88.08,518.86 98.35,490.05 108.63,495.44 118.91,472.13 129.19,498.71 139.47,500.48 149.74,443.86 160.02,501.36 170.30,462.87 180.58,440.87 190.86,456.33 201.13,443.20 211.41,461.93 221.69,412.25 231.97,470.02 242.25,415.94 252.52,356.45 262.80,329.09 273.08,334.52 283.36,452.89 293.64,352.10 303.91,468.89 314.19,311.52 324.47,316.19 334.75,345.51 345.03,428.16 355.30,462.05 365.58,436.22 375.86,469.58 386.14,406.79 396.42,376.07 406.69,405.84 416.97,433.88 427.25,430.42 437.53,469.13 447.81,476.51 458.08,426.93 468.36,434.30 478.64,381.92 488.92,461.29 499.20,462.23 509.47,432.90 519.75,508.00 530.03,429.24 540.31,452.59 550.59,437.30 560.86,468.05 571.14,475.11 581.42,475.45 591.70,509.52 601.98,445.39 612.25,445.61 622.53,488.43 632.81,483.34 643.09,484.55 653.37,460.28 663.64,500.52 673.92,469.01 684.20,459.40 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.24 88.08,504.38 98.35,497.45 108.63,495.53 118.91,492.63 129.19,502.00 139.47,477.93 149.74,498.76 160.02,498.83 170.30,439.83 180.58,452.74 190.86,453.94 201.13,449.03 211.41,411.79 221.69,390.50 231.97,468.37 242.25,401.51 252.52,356.50 262.80,382.39 273.08,442.73 283.36,381.55 293.64,347.95 303.91,447.38 314.19,367.24 324.47,286.79 334.75,387.50 345.03,452.10 355.30,460.83 365.58,434.38 375.86,478.57 386.14,434.50 396.42,397.68 406.69,410.06 416.97,427.44 427.25,440.55 437.53,445.24 447.81,483.47 458.08,475.23 468.36,435.33 478.64,417.29 488.92,436.27 499.20,454.31 509.47,445.81 519.75,474.69 530.03,434.33 540.31,463.43 550.59,471.69 560.86,446.08 571.14,480.10 581.42,489.76 591.70,481.13 601.98,479.75 612.25,427.76 622.53,449.64 632.81,488.01 643.09,478.08 653.37,484.25 663.64,486.71 673.92,408.32 684.20,458.54 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.17 88.08,520.68 98.35,466.87 108.63,453.16 118.91,478.92 129.19,492.68 139.47,491.90 149.74,481.28 160.02,503.70 170.30,456.92 180.58,435.01 190.86,421.37 201.13,442.41 211.41,481.33 221.69,445.51 231.97,496.30 242.25,331.70 252.52,361.34 262.80,365.30 273.08,418.37 283.36,481.18 293.64,451.51 303.91,414.49 314.19,320.34 324.47,339.69 334.75,396.25 345.03,427.07 355.30,443.77 365.58,471.64 375.86,441.85 386.14,315.79 396.42,421.45 406.69,408.91 416.97,449.62 427.25,414.05 437.53,455.44 447.81,492.12 458.08,427.52 468.36,403.03 478.64,466.50 488.92,462.91 499.20,482.04 509.47,490.32 519.75,487.15 530.03,444.18 540.31,467.27 550.59,467.19 560.86,461.02 571.14,490.37 581.42,496.84 591.70,481.47 601.98,474.30 612.25,468.40 622.53,448.07 632.81,488.26 643.09,483.07 653.37,496.05 663.64,485.87 673.92,408.27 684.20,436.27 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,502.88 88.08,515.20 98.35,487.08 108.63,469.90 118.91,495.71 129.19,498.71 139.47,499.35 149.74,500.99 160.02,514.81 170.30,393.37 180.58,411.07 190.86,441.01 201.13,447.08 211.41,473.41 221.69,445.02 231.97,475.16 242.25,46.53 252.52,259.85 262.80,437.01 273.08,455.47 283.36,423.09 293.64,418.82 303.91,451.68 314.19,311.52 324.47,380.15 334.75,396.15 345.03,429.68 355.30,494.82 365.58,446.00 375.86,445.29 386.14,387.03 396.42,446.54 406.69,434.77 416.97,464.02 427.25,486.49 437.53,478.43 447.81,499.71 458.08,393.23 468.36,467.24 478.64,459.94 488.92,460.06 499.20,496.27 509.47,471.40 519.75,478.16 530.03,430.27 540.31,454.39 550.59,463.58 560.86,469.50 571.14,496.40 581.42,480.29 591.70,500.82 601.98,421.72 612.25,466.09 622.53,466.50 632.81,480.42 643.09,500.80 653.37,476.34 663.64,481.97 673.92,454.88 684.20,430.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,507.90 88.08,506.45 98.35,490.94 108.63,485.97 118.91,505.05 129.19,505.02 139.47,498.88 149.74,494.82 160.02,516.53 170.30,404.51 180.58,421.77 190.86,448.14 201.13,432.46 211.41,464.73 221.69,476.07 231.97,466.43 242.25,243.40 252.52,300.11 262.80,299.27 273.08,325.13 283.36,407.93 293.64,460.48 303.91,477.57 314.19,344.16 324.47,334.84 334.75,414.66 345.03,437.52 355.30,446.84 365.58,489.19 375.86,484.79 386.14,329.41 396.42,428.94 406.69,419.55 416.97,390.42 427.25,459.92 437.53,484.13 447.81,490.96 458.08,339.29 468.36,439.83 478.64,459.35 488.92,380.47 499.20,491.13 509.47,469.18 519.75,498.36 530.03,387.33 540.31,376.98 550.59,407.48 560.86,399.25 571.14,464.02 581.42,470.07 591.70,495.24 601.98,406.43 612.25,438.65 622.53,466.92 632.81,485.75 643.09,478.97 653.37,489.83 663.64,509.01 673.92,434.65 684.20,431.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.19 88.08,515.89 98.35,473.56 108.63,479.70 118.91,482.60 129.19,481.50 139.47,488.58 149.74,464.83 160.02,488.50 170.30,429.90 180.58,473.04 190.86,432.46 201.13,397.45 211.41,460.11 221.69,459.89 231.97,489.46 242.25,372.11 252.52,371.89 262.80,327.45 273.08,420.07 283.36,448.07 293.64,461.76 303.91,472.31 314.19,258.71 324.47,389.78 334.75,393.84 345.03,451.58 355.30,437.96 365.58,428.55 375.86,457.31 386.14,305.42 396.42,413.09 406.69,390.35 416.97,443.64 427.25,464.91 437.53,455.22 447.81,486.32 458.08,347.90 468.36,418.18 478.64,439.73 488.92,468.32 499.20,498.36 509.47,477.54 519.75,490.99 530.03,389.29 540.31,413.09 550.59,463.70 560.86,443.45 571.14,471.03 581.42,486.83 591.70,484.28 601.98,426.78 612.25,454.04 622.53,424.37 632.81,479.19 643.09,493.15 653.37,457.95 663.64,505.83 673.92,420.14 684.20,481.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,518.47 88.08,515.54 98.35,495.76 108.63,475.97 118.91,490.99 129.19,501.29 139.47,492.73 149.74,497.26 160.02,509.13 170.30,467.07 180.58,411.29 190.86,440.10 201.13,460.90 211.41,462.45 221.69,494.94 231.97,475.80 242.25,356.67 252.52,439.93 262.80,338.68 273.08,425.97 283.36,472.45 293.64,438.23 303.91,463.82 314.19,426.83 324.47,324.05 334.75,372.95 345.03,420.07 355.30,437.96 365.58,461.29 375.86,472.60 386.14,410.06 396.42,465.40 406.69,427.74 416.97,406.35 427.25,460.73 437.53,497.65 447.81,491.13 458.08,380.66 468.36,413.14 478.64,441.16 488.92,474.47 499.20,490.23 509.47,480.88 519.75,494.53 530.03,434.67 540.31,435.41 550.59,470.39 560.86,486.81 571.14,496.00 581.42,510.48 591.70,503.11 601.98,450.26 612.25,425.40 622.53,440.08 632.81,465.72 643.09,499.00 653.37,487.74 663.64,490.00 673.92,464.51 684.20,445.88 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.81 88.08,513.45 98.35,473.39 108.63,486.10 118.91,476.31 129.19,467.76 139.47,498.76 149.74,495.93 160.02,490.91 170.30,387.99 180.58,431.57 190.86,449.57 201.13,393.23 211.41,458.71 221.69,479.26 231.97,452.62 242.25,405.69 252.52,382.58 262.80,306.33 273.08,380.00 283.36,455.91 293.64,456.01 303.91,448.02 314.19,329.41 324.47,377.15 334.75,396.20 345.03,430.84 355.30,467.93 365.58,483.88 375.86,417.14 386.14,378.53 396.42,423.14 406.69,436.27 416.97,463.50 427.25,480.44 437.53,458.20 447.81,490.05 458.08,433.34 468.36,401.12 478.64,464.98 488.92,452.93 499.20,488.75 509.47,480.34 519.75,489.41 530.03,444.40 540.31,404.39 550.59,471.62 560.86,466.73 571.14,498.31 581.42,499.91 591.70,495.46 601.98,455.88 612.25,487.69 622.53,424.86 632.81,435.16 643.09,484.67 653.37,504.70 663.64,501.29 673.92,459.06 684.20,434.55 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,512.23 88.08,519.90 98.35,502.10 108.63,506.74 118.91,500.40 129.19,485.28 139.47,483.83 149.74,492.93 160.02,491.41 170.30,404.39 180.58,439.37 190.86,418.82 201.13,449.08 211.41,455.81 221.69,425.65 231.97,479.14 242.25,232.90 252.52,450.40 262.80,423.61 273.08,379.02 283.36,483.49 293.64,456.43 303.91,488.01 314.19,364.44 324.47,308.15 334.75,279.93 345.03,405.93 355.30,481.70 365.58,471.42 375.86,468.64 386.14,401.51 396.42,395.73 406.69,381.80 416.97,479.53 427.25,457.53 437.53,475.25 447.81,477.96 458.08,449.40 468.36,447.53 478.64,428.28 488.92,468.94 499.20,467.56 509.47,487.40 519.75,499.76 530.03,436.24 540.31,415.05 550.59,419.53 560.86,462.91 571.14,480.81 581.42,494.92 591.70,464.24 601.98,435.83 612.25,442.00 622.53,424.91 632.81,465.10 643.09,479.95 653.37,480.20 663.64,506.45 673.92,472.43 684.20,450.89 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.55 88.08,512.89 98.35,489.22 108.63,473.61 118.91,475.33 129.19,494.11 139.47,496.84 149.74,491.38 160.02,488.75 170.30,449.64 180.58,459.92 190.86,486.96 201.13,472.26 211.41,460.36 221.69,432.19 231.97,426.66 242.25,377.91 252.52,407.09 262.80,409.25 273.08,435.95 283.36,441.75 293.64,438.33 303.91,451.75 314.19,294.75 324.47,400.55 334.75,408.56 345.03,441.36 355.30,450.55 365.58,467.17 375.86,470.14 386.14,394.36 396.42,431.89 406.69,406.30 416.97,437.20 427.25,470.95 437.53,492.98 447.81,473.88 458.08,404.98 468.36,428.16 478.64,492.19 488.92,440.10 499.20,478.60 509.47,474.39 519.75,483.86 530.03,463.11 540.31,435.38 550.59,461.51 560.86,466.43 571.14,495.93 581.42,493.67 591.70,493.00 601.98,429.31 612.25,469.67 622.53,436.32 632.81,480.76 643.09,491.41 653.37,480.29 663.64,511.10 673.92,484.92 684.20,452.76 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,506.13 88.08,514.76 98.35,491.55 108.63,494.38 118.91,496.44 129.19,500.11 139.47,498.58 149.74,493.32 160.02,501.80 170.30,439.66 180.58,397.36 190.86,440.62 201.13,480.79 211.41,467.02 221.69,461.93 231.97,447.58 242.25,384.75 252.52,381.40 262.80,375.13 273.08,449.57 283.36,443.05 293.64,439.88 303.91,447.04 314.19,204.64 324.47,391.53 334.75,421.49 345.03,430.17 355.30,384.72 365.58,439.44 375.86,448.83 386.14,381.18 396.42,420.22 406.69,416.28 416.97,420.86 427.25,461.02 437.53,461.34 447.81,436.74 458.08,411.39 468.36,451.75 478.64,448.61 488.92,488.41 499.20,497.55 509.47,489.29 519.75,493.74 530.03,422.31 540.31,429.95 550.59,475.28 560.86,443.64 571.14,504.90 581.42,488.87 591.70,504.65 601.98,466.97 612.25,464.76 622.53,473.34 632.81,486.78 643.09,480.25 653.37,489.32 663.64,500.06 673.92,428.80 684.20,467.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.55 88.08,520.71 98.35,488.36 108.63,500.82 118.91,469.43 129.19,470.29 139.47,498.44 149.74,492.66 160.02,500.35 170.30,443.47 180.58,469.08 190.86,410.24 201.13,439.96 211.41,450.26 221.69,444.45 231.97,486.12 242.25,370.24 252.52,380.12 262.80,351.98 273.08,435.24 283.36,433.96 293.64,464.93 303.91,467.00 314.19,375.11 324.47,325.13 334.75,365.55 345.03,429.39 355.30,466.68 365.58,447.97 375.86,451.09 386.14,338.26 396.42,431.92 406.69,409.89 416.97,434.84 427.25,481.20 437.53,457.97 447.81,498.68 458.08,391.04 468.36,488.75 478.64,447.40 488.92,411.61 499.20,466.53 509.47,475.16 519.75,508.10 530.03,423.49 540.31,443.47 550.59,419.45 560.86,456.65 571.14,487.20 581.42,484.92 591.70,496.89 601.98,431.01 612.25,457.58 622.53,448.49 632.81,472.31 643.09,499.89 653.37,491.72 663.64,491.65 673.92,417.41 684.20,468.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.09 88.08,507.83 98.35,481.35 108.63,459.06 118.91,471.47 129.19,505.47 139.47,488.21 149.74,493.72 160.02,479.31 170.30,407.88 180.58,403.67 190.86,433.47 201.13,416.95 211.41,484.50 221.69,367.81 231.97,469.55 242.25,374.54 252.52,366.63 262.80,352.03 273.08,415.40 283.36,463.19 293.64,465.99 303.91,471.81 314.19,383.59 324.47,316.97 334.75,374.45 345.03,439.10 355.30,448.68 365.58,444.45 375.86,477.96 386.14,388.78 396.42,437.65 406.69,357.21 416.97,457.92 427.25,460.38 437.53,477.02 447.81,486.46 458.08,423.22 468.36,405.20 478.64,475.13 488.92,477.00 499.20,493.52 509.47,493.69 519.75,494.06 530.03,469.26 540.31,470.71 550.59,492.12 560.86,414.07 571.14,490.91 581.42,493.84 591.70,487.64 601.98,440.15 612.25,466.01 622.53,462.37 632.81,478.72 643.09,493.15 653.37,486.22 663.64,504.48 673.92,420.68 684.20,450.18 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,512.40 88.08,511.56 98.35,485.80 108.63,493.13 118.91,478.92 129.19,467.76 139.47,481.18 149.74,487.67 160.02,492.83 170.30,438.75 180.58,397.63 190.86,417.19 201.13,417.02 211.41,437.87 221.69,425.35 231.97,423.98 242.25,390.60 252.52,323.05 262.80,367.07 273.08,343.57 283.36,431.89 293.64,427.22 303.91,436.54 314.19,311.81 324.47,340.84 334.75,372.38 345.03,392.76 355.30,416.46 365.58,454.07 375.86,471.13 386.14,374.72 396.42,290.74 406.69,390.40 416.97,424.76 427.25,439.71 437.53,442.59 447.81,499.49 458.08,425.16 468.36,424.79 478.64,438.41 488.92,464.22 499.20,465.91 509.47,489.59 519.75,495.29 530.03,475.35 540.31,473.56 550.59,487.28 560.86,458.93 571.14,481.87 581.42,478.72 591.70,494.63 601.98,454.16 612.25,386.69 622.53,430.30 632.81,446.37 643.09,485.21 653.37,480.02 663.64,495.58 673.92,476.29 684.20,448.02 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.52 88.08,511.37 98.35,501.58 108.63,500.60 118.91,481.82 129.19,500.65 139.47,499.66 149.74,492.49 160.02,499.15 170.30,449.00 180.58,471.79 190.86,391.43 201.13,460.11 211.41,439.51 221.69,470.04 231.97,445.66 242.25,389.71 252.52,382.80 262.80,338.53 273.08,382.83 283.36,442.27 293.64,465.72 303.91,453.62 314.19,343.47 324.47,399.27 334.75,365.92 345.03,453.70 355.30,489.98 365.58,462.64 375.86,463.11 386.14,259.11 396.42,346.50 406.69,270.59 416.97,456.38 427.25,488.80 437.53,472.48 447.81,488.80 458.08,398.17 468.36,361.88 478.64,423.54 488.92,465.40 499.20,484.92 509.47,497.97 519.75,504.61 530.03,452.76 540.31,443.47 550.59,458.22 560.86,456.08 571.14,479.68 581.42,474.81 591.70,505.15 601.98,451.12 612.25,473.61 622.53,431.94 632.81,454.80 643.09,492.44 653.37,487.57 663.64,504.09 673.92,425.30 684.20,444.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,518.03 88.08,517.27 98.35,499.62 108.63,511.83 118.91,501.66 129.19,470.39 139.47,483.81 149.74,504.93 160.02,505.22 170.30,415.42 180.58,412.55 190.86,400.43 201.13,408.47 211.41,488.63 221.69,438.11 231.97,492.36 242.25,333.07 252.52,377.71 262.80,378.58 273.08,402.25 283.36,455.22 293.64,449.69 303.91,444.50 314.19,253.90 324.47,242.66 334.75,420.68 345.03,389.74 355.30,467.04 365.58,450.55 375.86,470.26 386.14,188.19 396.42,401.19 406.69,407.56 416.97,428.50 427.25,475.13 437.53,456.28 447.81,426.41 458.08,359.38 468.36,392.00 478.64,426.98 488.92,457.83 499.20,456.72 509.47,465.03 519.75,488.73 530.03,371.03 540.31,465.59 550.59,452.34 560.86,456.60 571.14,481.38 581.42,501.07 591.70,495.09 601.98,414.39 612.25,431.16 622.53,411.66 632.81,469.65 643.09,459.52 653.37,499.44 663.64,499.47 673.92,460.09 684.20,482.63 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,504.78 88.08,488.41 98.35,491.48 108.63,490.27 118.91,486.29 129.19,506.42 139.47,494.01 149.74,485.65 160.02,499.42 170.30,429.71 180.58,417.49 190.86,384.18 201.13,447.82 211.41,411.88 221.69,437.33 231.97,453.52 242.25,350.09 252.52,410.68 262.80,316.24 273.08,420.93 283.36,370.54 293.64,434.67 303.91,468.45 314.19,197.09 324.47,344.53 334.75,311.05 345.03,466.75 355.30,401.78 365.58,439.51 375.86,473.29 386.14,398.71 396.42,398.78 406.69,418.08 416.97,464.64 427.25,479.78 437.53,470.95 447.81,503.18 458.08,450.87 468.36,437.40 478.64,453.60 488.92,453.21 499.20,489.09 509.47,477.71 519.75,498.41 530.03,425.50 540.31,473.14 550.59,443.59 560.86,473.26 571.14,489.83 581.42,499.86 591.70,500.06 601.98,433.27 612.25,480.22 622.53,463.28 632.81,493.13 643.09,499.42 653.37,488.23 663.64,497.45 673.92,440.89 684.20,432.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.66 88.08,519.77 98.35,509.89 108.63,509.01 118.91,478.35 129.19,493.05 139.47,497.18 149.74,500.82 160.02,505.32 170.30,416.28 180.58,440.72 190.86,440.59 201.13,434.25 211.41,480.12 221.69,472.21 231.97,479.61 242.25,360.51 252.52,359.94 262.80,403.40 273.08,402.86 283.36,448.22 293.64,402.52 303.91,476.29 314.19,387.82 324.47,443.23 334.75,397.87 345.03,406.35 355.30,459.72 365.58,441.18 375.86,453.57 386.14,400.35 396.42,455.00 406.69,461.93 416.97,456.97 427.25,491.11 437.53,502.66 447.81,475.50 458.08,441.21 468.36,413.80 478.64,430.54 488.92,395.56 499.20,475.23 509.47,463.68 519.75,476.66 530.03,418.72 540.31,445.44 550.59,385.26 560.86,452.42 571.14,462.40 581.42,497.38 591.70,472.97 601.98,457.41 612.25,441.53 622.53,495.58 632.81,399.42 643.09,444.70 653.37,468.54 663.64,464.44 673.92,387.77 684.20,479.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,499.25 88.08,513.41 98.35,492.61 108.63,490.62 118.91,504.02 129.19,497.48 139.47,505.49 149.74,488.38 160.02,487.28 170.30,433.07 180.58,446.27 190.86,424.89 201.13,429.31 211.41,466.80 221.69,441.70 231.97,440.57 242.25,301.27 252.52,351.19 262.80,329.58 273.08,438.23 283.36,439.88 293.64,445.78 303.91,476.19 314.19,295.39 324.47,350.85 334.75,428.75 345.03,384.11 355.30,407.95 365.58,433.54 375.86,479.93 386.14,306.85 396.42,267.56 406.69,454.56 416.97,438.43 427.25,467.34 437.53,452.69 447.81,500.55 458.08,360.80 468.36,420.17 478.64,447.31 488.92,473.71 499.20,492.73 509.47,481.70 519.75,482.29 530.03,432.46 540.31,429.95 550.59,438.48 560.86,463.90 571.14,447.26 581.42,470.73 591.70,491.48 601.98,405.62 612.25,448.81 622.53,446.42 632.81,470.88 643.09,466.06 653.37,477.93 663.64,498.21 673.92,379.02 684.20,392.17 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.56 88.08,519.35 98.35,497.53 108.63,493.91 118.91,469.18 129.19,505.83 139.47,490.47 149.74,503.99 160.02,502.00 170.30,376.07 180.58,429.48 190.86,440.52 201.13,464.93 211.41,475.11 221.69,433.32 231.97,462.45 242.25,292.37 252.52,433.47 262.80,380.98 273.08,434.74 283.36,421.05 293.64,441.97 303.91,504.04 314.19,277.45 324.47,327.03 334.75,346.74 345.03,466.75 355.30,464.32 365.58,397.21 375.86,467.44 386.14,339.59 396.42,429.63 406.69,422.85 416.97,430.22 427.25,446.84 437.53,475.62 447.81,473.76 458.08,323.59 468.36,412.30 478.64,476.19 488.92,463.97 499.20,469.92 509.47,486.42 519.75,502.22 530.03,416.04 540.31,457.68 550.59,442.44 560.86,459.50 571.14,461.59 581.42,471.00 591.70,487.99 601.98,427.00 612.25,440.74 622.53,471.89 632.81,495.63 643.09,478.84 653.37,493.35 663.64,508.93 673.92,429.51 684.20,471.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.14 88.08,510.65 98.35,478.87 108.63,477.07 118.91,497.03 129.19,502.86 139.47,490.52 149.74,491.06 160.02,505.39 170.30,428.30 180.58,429.85 190.86,444.45 201.13,452.91 211.41,489.19 221.69,482.06 231.97,450.08 242.25,231.50 252.52,273.32 262.80,453.50 273.08,436.56 283.36,423.51 293.64,422.97 303.91,472.01 314.19,335.98 324.47,338.51 334.75,462.89 345.03,427.30 355.30,439.41 365.58,454.11 375.86,476.73 386.14,362.01 396.42,381.94 406.69,461.51 416.97,432.63 427.25,487.69 437.53,484.20 447.81,488.53 458.08,452.37 468.36,441.23 478.64,446.47 488.92,443.67 499.20,466.26 509.47,486.39 519.75,485.31 530.03,476.63 540.31,457.11 550.59,447.50 560.86,485.21 571.14,479.29 581.42,484.37 591.70,500.92 601.98,428.21 612.25,474.96 622.53,471.84 632.81,474.54 643.09,506.74 653.37,464.59 663.64,510.73 673.92,463.68 684.20,453.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,512.79 88.08,516.43 98.35,496.74 108.63,501.29 118.91,483.74 129.19,491.41 139.47,506.30 149.74,502.61 160.02,501.73 170.30,443.05 180.58,423.78 190.86,431.67 201.13,445.39 211.41,467.81 221.69,439.64 231.97,471.22 242.25,406.70 252.52,359.57 262.80,356.75 273.08,470.54 283.36,413.16 293.64,409.89 303.91,480.61 314.19,154.34 324.47,385.97 334.75,446.15 345.03,417.44 355.30,459.74 365.58,453.80 375.86,444.50 386.14,365.72 396.42,303.99 406.69,462.94 416.97,470.78 427.25,430.89 437.53,454.14 447.81,476.02 458.08,347.80 468.36,435.16 478.64,459.79 488.92,429.39 499.20,462.03 509.47,494.40 519.75,479.21 530.03,451.98 540.31,431.18 550.59,452.59 560.86,430.49 571.14,473.61 581.42,496.67 591.70,501.95 601.98,435.58 612.25,433.24 622.53,444.36 632.81,461.22 643.09,484.62 653.37,497.99 663.64,484.84 673.92,478.33 684.20,460.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,516.06 88.08,516.82 98.35,498.41 108.63,496.76 118.91,498.73 129.19,505.37 139.47,511.51 149.74,506.57 160.02,497.16 170.30,436.12 180.58,386.29 190.86,409.72 201.13,459.08 211.41,443.64 221.69,432.41 231.97,470.61 242.25,328.48 252.52,365.37 262.80,322.70 273.08,431.43 283.36,443.05 293.64,404.90 303.91,427.74 314.19,294.83 324.47,311.32 334.75,415.28 345.03,432.61 355.30,454.73 365.58,445.58 375.86,470.83 386.14,344.21 396.42,389.12 406.69,446.37 416.97,438.55 427.25,460.78 437.53,441.36 447.81,499.27 458.08,428.77 468.36,402.52 478.64,417.61 488.92,469.63 499.20,472.65 509.47,494.35 519.75,489.95 530.03,472.13 540.31,408.10 550.59,464.41 560.86,467.22 571.14,474.98 581.42,497.99 591.70,493.96 601.98,456.50 612.25,477.02 622.53,480.79 632.81,471.17 643.09,477.25 653.37,489.98 663.64,489.56 673.92,481.57 684.20,455.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.14 88.08,509.30 98.35,458.49 108.63,465.62 118.91,456.55 129.19,471.91 139.47,486.02 149.74,470.71 160.02,485.63 170.30,435.51 180.58,340.65 190.86,405.62 201.13,357.73 211.41,481.13 221.69,467.39 231.97,458.79 242.25,288.66 252.52,368.69 262.80,357.12 273.08,374.30 283.36,445.66 293.64,446.00 303.91,474.30 314.19,330.00 324.47,383.29 334.75,398.86 345.03,382.14 355.30,467.63 365.58,461.00 375.86,465.62 386.14,388.01 396.42,402.15 406.69,415.72 416.97,426.21 427.25,495.12 437.53,419.50 447.81,497.58 458.08,366.80 468.36,476.98 478.64,480.02 488.92,444.33 499.20,499.05 509.47,456.16 519.75,491.09 530.03,405.10 540.31,431.33 550.59,466.53 560.86,466.75 571.14,482.04 581.42,491.58 591.70,499.96 601.98,390.92 612.25,447.60 622.53,443.23 632.81,484.23 643.09,498.41 653.37,499.69 663.64,474.54 673.92,451.71 684.20,454.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.56 88.08,507.41 98.35,494.11 108.63,479.63 118.91,482.63 129.19,509.79 139.47,494.16 149.74,506.40 160.02,509.50 170.30,436.86 180.58,446.47 190.86,434.30 201.13,439.32 211.41,449.81 221.69,466.41 231.97,465.00 242.25,268.65 252.52,383.25 262.80,324.18 273.08,472.75 283.36,423.56 293.64,415.13 303.91,460.97 314.19,315.72 324.47,390.69 334.75,405.42 345.03,430.89 355.30,410.26 365.58,472.72 375.86,478.28 386.14,448.81 396.42,418.62 406.69,429.31 416.97,464.44 427.25,485.83 437.53,463.06 447.81,495.04 458.08,402.79 468.36,374.54 478.64,395.98 488.92,469.23 499.20,472.94 509.47,480.98 519.75,500.62 530.03,404.68 540.31,401.49 550.59,455.12 560.86,475.30 571.14,497.23 581.42,457.43 591.70,501.80 601.98,401.93 612.25,480.84 622.53,448.83 632.81,470.07 643.09,498.80 653.37,497.35 663.64,485.92 673.92,445.90 684.20,446.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.74 88.08,518.30 98.35,474.22 108.63,501.48 118.91,476.56 129.19,487.01 139.47,490.30 149.74,492.14 160.02,471.17 170.30,481.25 180.58,439.73 190.86,405.17 201.13,447.70 211.41,411.91 221.69,414.91 231.97,413.28 242.25,350.01 252.52,406.48 262.80,420.34 273.08,472.87 283.36,356.28 293.64,395.09 303.91,474.32 314.19,402.98 324.47,338.97 334.75,418.55 345.03,451.66 355.30,458.02 365.58,448.71 375.86,467.12 386.14,387.08 396.42,376.24 406.69,423.61 416.97,384.40 427.25,462.89 437.53,459.72 447.81,475.62 458.08,430.12 468.36,439.32 478.64,483.22 488.92,481.92 499.20,476.36 509.47,480.98 519.75,489.51 530.03,422.11 540.31,479.09 550.59,462.84 560.86,460.48 571.14,489.22 581.42,499.81 591.70,488.36 601.98,440.10 612.25,441.48 622.53,457.95 632.81,480.52 643.09,488.04 653.37,494.92 663.64,487.25 673.92,442.36 684.20,447.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.27 88.08,509.25 98.35,489.93 108.63,487.23 118.91,506.03 129.19,500.21 139.47,499.74 149.74,482.88 160.02,486.51 170.30,439.88 180.58,431.89 190.86,442.59 201.13,420.61 211.41,470.22 221.69,445.39 231.97,462.99 242.25,271.52 252.52,398.46 262.80,387.28 273.08,417.12 283.36,439.51 293.64,451.14 303.91,400.11 314.19,387.35 324.47,366.06 334.75,337.55 345.03,445.56 355.30,392.34 365.58,397.13 375.86,408.39 386.14,420.04 396.42,398.07 406.69,318.20 416.97,447.50 427.25,467.95 437.53,430.25 447.81,463.16 458.08,322.38 468.36,440.28 478.64,407.07 488.92,440.79 499.20,465.67 509.47,464.14 519.75,481.40 530.03,438.21 540.31,465.25 550.59,463.63 560.86,462.79 571.14,503.72 581.42,462.13 591.70,505.20 601.98,436.22 612.25,473.19 622.53,467.86 632.81,495.04 643.09,473.09 653.37,500.13 663.64,501.19 673.92,448.66 684.20,435.90 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.21 88.08,517.19 98.35,491.70 108.63,493.81 118.91,475.25 129.19,488.21 139.47,473.04 149.74,482.11 160.02,490.03 170.30,434.57 180.58,379.07 190.86,483.71 201.13,438.95 211.41,448.29 221.69,442.05 231.97,489.44 242.25,125.80 252.52,422.48 262.80,347.95 273.08,438.38 283.36,423.61 293.64,394.45 303.91,474.22 314.19,345.17 324.47,378.97 334.75,440.10 345.03,377.12 355.30,433.98 365.58,413.11 375.86,488.92 386.14,335.04 396.42,401.95 406.69,420.49 416.97,422.31 427.25,440.13 437.53,392.22 447.81,473.85 458.08,427.22 468.36,452.25 478.64,431.30 488.92,474.25 499.20,479.68 509.47,449.67 519.75,482.80 530.03,429.12 540.31,461.02 550.59,447.23 560.86,455.88 571.14,491.97 581.42,477.54 591.70,497.77 601.98,362.97 612.25,453.94 622.53,461.00 632.81,454.31 643.09,486.83 653.37,476.04 663.64,503.72 673.92,434.77 684.20,458.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.81 88.08,508.69 98.35,449.81 108.63,490.30 118.91,492.17 129.19,478.67 139.47,465.86 149.74,487.60 160.02,493.30 170.30,449.42 180.58,460.70 190.86,461.27 201.13,421.15 211.41,474.59 221.69,417.07 231.97,421.20 242.25,334.55 252.52,434.20 262.80,386.39 273.08,309.50 283.36,399.13 293.64,437.94 303.91,433.54 314.19,347.36 324.47,369.04 334.75,397.80 345.03,366.28 355.30,433.42 365.58,425.08 375.86,429.71 386.14,373.49 396.42,450.03 406.69,394.63 416.97,448.61 427.25,463.50 437.53,456.60 447.81,479.61 458.08,420.59 468.36,431.92 478.64,458.32 488.92,471.62 499.20,483.98 509.47,481.30 519.75,484.74 530.03,464.66 540.31,442.17 550.59,412.40 560.86,482.14 571.14,506.67 581.42,485.28 591.70,489.17 601.98,454.66 612.25,460.46 622.53,466.82 632.81,458.34 643.09,489.41 653.37,493.99 663.64,501.70 673.92,401.21 684.20,444.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,516.72 88.08,517.68 98.35,495.83 108.63,496.64 118.91,490.74 129.19,494.90 139.47,508.10 149.74,492.68 160.02,497.87 170.30,460.31 180.58,439.71 190.86,470.83 201.13,450.18 211.41,449.08 221.69,467.46 231.97,430.57 242.25,340.15 252.52,319.41 262.80,347.45 273.08,384.45 283.36,461.66 293.64,400.82 303.91,444.09 314.19,379.12 324.47,319.04 334.75,355.81 345.03,430.84 355.30,490.15 365.58,477.86 375.86,485.97 386.14,406.50 396.42,380.71 406.69,443.91 416.97,416.70 427.25,481.50 437.53,445.76 447.81,498.73 458.08,376.31 468.36,428.01 478.64,426.48 488.92,496.96 499.20,478.70 509.47,475.06 519.75,478.52 530.03,447.82 540.31,425.40 550.59,431.97 560.86,435.83 571.14,477.98 581.42,476.04 591.70,462.13 601.98,438.85 612.25,452.22 622.53,453.57 632.81,470.58 643.09,491.72 653.37,474.44 663.64,489.91 673.92,436.71 684.20,430.96 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,505.96 88.08,517.66 98.35,481.35 108.63,487.99 118.91,489.61 129.19,490.27 139.47,484.42 149.74,504.75 160.02,495.09 170.30,414.46 180.58,429.14 190.86,331.28 201.13,407.04 211.41,480.54 221.69,447.08 231.97,483.83 242.25,389.54 252.52,429.53 262.80,341.19 273.08,417.19 283.36,477.27 293.64,404.66 303.91,478.45 314.19,282.04 324.47,363.46 334.75,240.72 345.03,364.47 355.30,472.87 365.58,466.09 375.86,461.91 386.14,359.60 396.42,380.07 406.69,317.34 416.97,468.08 427.25,429.61 437.53,478.92 447.81,474.49 458.08,432.24 468.36,463.21 478.64,407.26 488.92,470.98 499.20,488.70 509.47,492.22 519.75,510.09 530.03,441.38 540.31,464.29 550.59,466.33 560.86,467.78 571.14,510.16 581.42,489.32 591.70,498.53 601.98,384.01 612.25,459.87 622.53,398.76 632.81,456.89 643.09,482.88 653.37,476.71 663.64,484.60 673.92,445.66 684.20,474.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.63 88.08,520.09 98.35,490.57 108.63,484.65 118.91,490.45 129.19,489.86 139.47,500.55 149.74,482.29 160.02,499.69 170.30,423.95 180.58,436.51 190.86,400.72 201.13,412.13 211.41,460.19 221.69,465.15 231.97,443.82 242.25,361.27 252.52,391.65 262.80,331.75 273.08,368.45 283.36,405.74 293.64,432.16 303.91,490.27 314.19,388.21 324.47,411.64 334.75,452.20 345.03,437.55 355.30,451.53 365.58,443.15 375.86,469.18 386.14,374.52 396.42,427.94 406.69,401.85 416.97,414.71 427.25,477.81 437.53,495.63 447.81,487.10 458.08,396.69 468.36,449.37 478.64,466.90 488.92,464.64 499.20,447.28 509.47,486.07 519.75,494.63 530.03,428.53 540.31,471.74 550.59,480.79 560.86,467.59 571.14,477.76 581.42,498.09 591.70,506.35 601.98,459.23 612.25,434.74 622.53,469.75 632.81,459.62 643.09,477.59 653.37,477.02 663.64,487.23 673.92,389.83 684.20,414.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.17 88.08,517.73 98.35,496.84 108.63,491.33 118.91,472.03 129.19,493.52 139.47,478.75 149.74,488.11 160.02,481.35 170.30,436.78 180.58,449.03 190.86,425.72 201.13,484.30 211.41,470.39 221.69,457.88 231.97,462.89 242.25,442.93 252.52,381.92 262.80,432.46 273.08,402.08 283.36,474.94 293.64,425.70 303.91,458.29 314.19,348.17 324.47,403.92 334.75,401.76 345.03,417.07 355.30,473.04 365.58,450.75 375.86,464.91 386.14,419.31 396.42,401.90 406.69,388.58 416.97,446.35 427.25,442.68 437.53,440.72 447.81,491.06 458.08,387.33 468.36,477.69 478.64,413.43 488.92,474.91 499.20,459.94 509.47,480.76 519.75,500.43 530.03,449.42 540.31,448.83 550.59,463.78 560.86,446.45 571.14,448.49 581.42,470.12 591.70,497.72 601.98,386.00 612.25,453.84 622.53,452.17 632.81,468.69 643.09,491.41 653.37,485.36 663.64,479.19 673.92,412.35 684.20,421.77 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.92 88.08,511.88 98.35,459.35 108.63,479.73 118.91,483.15 129.19,493.05 139.47,490.69 149.74,485.24 160.02,500.77 170.30,354.29 180.58,466.04 190.86,444.82 201.13,444.58 211.41,451.93 221.69,432.36 231.97,468.18 242.25,322.60 252.52,370.34 262.80,414.88 273.08,441.73 283.36,378.11 293.64,441.48 303.91,431.23 314.19,266.51 324.47,336.61 334.75,372.92 345.03,409.94 355.30,446.49 365.58,458.71 375.86,488.87 386.14,319.19 396.42,380.10 406.69,377.89 416.97,447.21 427.25,387.89 437.53,444.48 447.81,493.05 458.08,436.29 468.36,415.77 478.64,456.47 488.92,427.39 499.20,492.71 509.47,449.47 519.75,479.63 530.03,466.50 540.31,467.09 550.59,490.13 560.86,497.65 571.14,498.63 581.42,493.62 591.70,505.96 601.98,413.36 612.25,476.95 622.53,478.57 632.81,459.01 643.09,483.64 653.37,479.04 663.64,502.32 673.92,386.47 684.20,485.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.02 88.08,519.26 98.35,502.74 108.63,499.54 118.91,486.14 129.19,488.82 139.47,513.68 149.74,506.87 160.02,486.46 170.30,441.36 180.58,411.39 190.86,399.84 201.13,386.44 211.41,483.05 221.69,454.04 231.97,470.61 242.25,348.81 252.52,326.09 262.80,370.88 273.08,412.72 283.36,453.25 293.64,464.98 303.91,442.29 314.19,371.57 324.47,396.47 334.75,361.17 345.03,411.39 355.30,479.11 365.58,478.45 375.86,466.06 386.14,349.27 396.42,381.80 406.69,398.19 416.97,430.05 427.25,490.91 437.53,461.46 447.81,470.71 458.08,384.62 468.36,451.90 478.64,460.19 488.92,455.71 499.20,482.60 509.47,502.37 519.75,475.35 530.03,457.09 540.31,449.76 550.59,449.17 560.86,463.48 571.14,495.02 581.42,437.23 591.70,467.39 601.98,368.79 612.25,412.99 622.53,411.86 632.81,437.37 643.09,482.53 653.37,471.57 663.64,498.17 673.92,405.89 684.20,378.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.09 88.08,515.99 98.35,491.45 108.63,491.06 118.91,481.25 129.19,478.03 139.47,495.24 149.74,500.65 160.02,498.53 170.30,443.32 180.58,440.30 190.86,448.46 201.13,392.69 211.41,456.67 221.69,444.97 231.97,455.76 242.25,364.69 252.52,377.64 262.80,398.71 273.08,391.01 283.36,356.18 293.64,437.25 303.91,472.92 314.19,372.60 324.47,435.29 334.75,404.34 345.03,447.26 355.30,438.97 365.58,468.72 375.86,493.96 386.14,351.68 396.42,434.57 406.69,414.37 416.97,442.56 427.25,480.20 437.53,462.18 447.81,472.26 458.08,442.07 468.36,394.68 478.64,418.79 488.92,447.75 499.20,484.94 509.47,488.53 519.75,489.93 530.03,472.48 540.31,481.72 550.59,482.90 560.86,448.68 571.14,482.43 581.42,477.17 591.70,499.07 601.98,401.61 612.25,464.96 622.53,462.74 632.81,412.65 643.09,477.12 653.37,487.91 663.64,494.26 673.92,457.14 684.20,449.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.95 88.08,510.63 98.35,501.85 108.63,496.71 118.91,496.35 129.19,479.63 139.47,487.94 149.74,474.03 160.02,492.19 170.30,455.86 180.58,432.58 190.86,435.53 201.13,429.36 211.41,422.60 221.69,455.32 231.97,461.81 242.25,351.17 252.52,354.51 262.80,343.28 273.08,427.42 283.36,431.11 293.64,425.38 303.91,465.52 314.19,344.28 324.47,444.45 334.75,419.26 345.03,422.70 355.30,468.52 365.58,476.46 375.86,448.17 386.14,389.96 396.42,439.54 406.69,448.88 416.97,438.36 427.25,458.86 437.53,484.55 447.81,492.46 458.08,441.16 468.36,457.61 478.64,403.57 488.92,457.36 499.20,480.47 509.47,489.81 519.75,471.15 530.03,430.91 540.31,459.01 550.59,480.27 560.86,488.28 571.14,499.30 581.42,471.47 591.70,487.28 601.98,422.85 612.25,464.83 622.53,471.99 632.81,461.64 643.09,497.87 653.37,477.96 663.64,467.32 673.92,444.40 684.20,442.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,516.48 88.08,517.76 98.35,478.82 108.63,492.46 118.91,496.27 129.19,492.66 139.47,491.43 149.74,473.36 160.02,478.30 170.30,481.35 180.58,410.06 190.86,470.83 201.13,458.22 211.41,470.66 221.69,454.61 231.97,442.78 242.25,329.49 252.52,365.60 262.80,336.49 273.08,443.42 283.36,425.97 293.64,410.06 303.91,444.40 314.19,369.95 324.47,395.04 334.75,359.99 345.03,436.54 355.30,400.97 365.58,464.24 375.86,454.29 386.14,415.20 396.42,383.49 406.69,380.62 416.97,452.07 427.25,423.93 437.53,455.93 447.81,470.51 458.08,387.92 468.36,426.24 478.64,469.08 488.92,449.00 499.20,439.64 509.47,492.24 519.75,481.84 530.03,462.28 540.31,412.60 550.59,472.16 560.86,460.01 571.14,470.41 581.42,496.27 591.70,491.68 601.98,486.93 612.25,474.74 622.53,491.31 632.81,486.39 643.09,469.18 653.37,481.40 663.64,508.07 673.92,434.92 684.20,465.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.00 88.08,517.04 98.35,460.85 108.63,493.89 118.91,476.04 129.19,496.40 139.47,509.42 149.74,506.57 160.02,491.31 170.30,463.19 180.58,412.79 190.86,424.15 201.13,442.88 211.41,474.74 221.69,427.54 231.97,451.24 242.25,289.64 252.52,443.00 262.80,210.81 273.08,465.96 283.36,458.22 293.64,447.55 303.91,472.16 314.19,361.05 324.47,432.73 334.75,365.84 345.03,312.33 355.30,476.61 365.58,377.59 375.86,456.72 386.14,337.18 396.42,389.29 406.69,393.77 416.97,408.47 427.25,480.76 437.53,486.54 447.81,480.32 458.08,431.43 468.36,356.80 478.64,421.91 488.92,422.50 499.20,473.19 509.47,480.84 519.75,484.65 530.03,454.07 540.31,436.51 550.59,492.27 560.86,482.51 571.14,497.53 581.42,478.40 591.70,502.22 601.98,448.56 612.25,469.31 622.53,464.41 632.81,452.42 643.09,475.80 653.37,495.85 663.64,484.50 673.92,408.59 684.20,477.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,521.10 88.08,517.66 98.35,491.87 108.63,495.17 118.91,491.41 129.19,493.00 139.47,491.48 149.74,501.04 160.02,509.03 170.30,433.20 180.58,439.76 190.86,384.35 201.13,471.40 211.41,480.59 221.69,447.65 231.97,481.01 242.25,315.74 252.52,396.08 262.80,321.40 273.08,325.63 283.36,457.80 293.64,413.60 303.91,447.80 314.19,277.64 324.47,441.04 334.75,411.05 345.03,385.56 355.30,450.57 365.58,455.05 375.86,463.82 386.14,402.89 396.42,408.98 406.69,427.10 416.97,427.07 427.25,467.54 437.53,458.29 447.81,472.85 458.08,382.61 468.36,431.38 478.64,463.73 488.92,483.15 499.20,481.33 509.47,492.76 519.75,500.30 530.03,449.44 540.31,479.43 550.59,454.39 560.86,477.00 571.14,492.41 581.42,495.78 591.70,468.67 601.98,414.56 612.25,461.66 622.53,414.56 632.81,486.93 643.09,481.79 653.37,477.37 663.64,503.45 673.92,415.82 684.20,466.04 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.54 88.08,514.59 98.35,491.50 108.63,483.39 118.91,482.26 129.19,482.95 139.47,499.81 149.74,499.98 160.02,484.82 170.30,300.90 180.58,404.24 190.86,373.02 201.13,486.46 211.41,446.22 221.69,426.85 231.97,426.44 242.25,301.88 252.52,391.01 262.80,377.00 273.08,440.67 283.36,409.77 293.64,353.18 303.91,410.51 314.19,327.57 324.47,352.05 334.75,342.76 345.03,407.56 355.30,419.50 365.58,447.87 375.86,476.85 386.14,343.33 396.42,361.12 406.69,397.23 416.97,495.36 427.25,478.38 437.53,489.83 447.81,452.96 458.08,319.65 468.36,462.33 478.64,437.28 488.92,489.41 499.20,456.87 509.47,436.47 519.75,493.96 530.03,423.14 540.31,432.26 550.59,462.50 560.86,471.32 571.14,469.77 581.42,493.40 591.70,473.31 601.98,370.54 612.25,452.96 622.53,448.39 632.81,481.20 643.09,495.09 653.37,494.08 663.64,486.71 673.92,413.65 684.20,444.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.51 88.08,515.10 98.35,507.65 108.63,488.43 118.91,486.29 129.19,496.17 139.47,476.95 149.74,497.58 160.02,501.36 170.30,439.83 180.58,405.69 190.86,435.58 201.13,460.80 211.41,432.36 221.69,417.44 231.97,476.95 242.25,304.63 252.52,292.34 262.80,373.12 273.08,446.84 283.36,456.74 293.64,437.57 303.91,447.31 314.19,266.26 324.47,329.63 334.75,403.13 345.03,439.32 355.30,428.08 365.58,441.14 375.86,464.49 386.14,390.03 396.42,446.94 406.69,415.50 416.97,436.93 427.25,447.28 437.53,480.37 447.81,498.95 458.08,400.90 468.36,412.38 478.64,394.18 488.92,474.69 499.20,469.16 509.47,502.52 519.75,507.65 530.03,416.41 540.31,402.69 550.59,438.90 560.86,471.67 571.14,483.93 581.42,487.10 591.70,492.17 601.98,467.73 612.25,458.24 622.53,460.06 632.81,493.81 643.09,504.68 653.37,479.56 663.64,506.87 673.92,413.41 684.20,444.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.77 88.08,514.22 98.35,476.16 108.63,504.46 118.91,488.75 129.19,492.71 139.47,499.81 149.74,492.34 160.02,479.46 170.30,445.34 180.58,429.90 190.86,432.80 201.13,458.66 211.41,446.86 221.69,476.19 231.97,474.98 242.25,384.97 252.52,378.16 262.80,427.52 273.08,409.77 283.36,464.96 293.64,447.21 303.91,443.57 314.19,366.26 324.47,437.55 334.75,324.91 345.03,396.45 355.30,469.53 365.58,472.72 375.86,445.34 386.14,346.47 396.42,389.74 406.69,334.40 416.97,411.81 427.25,464.49 437.53,475.28 447.81,478.84 458.08,425.82 468.36,443.99 478.64,447.70 488.92,457.46 499.20,475.06 509.47,489.86 519.75,486.69 530.03,349.05 540.31,383.76 550.59,466.09 560.86,446.52 571.14,481.70 581.42,482.04 591.70,492.31 601.98,416.36 612.25,475.67 622.53,437.10 632.81,490.03 643.09,488.80 653.37,460.75 663.64,490.91 673.92,411.74 684.20,485.75 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.83 88.08,519.03 98.35,483.05 108.63,491.45 118.91,503.50 129.19,492.56 139.47,495.71 149.74,500.52 160.02,490.79 170.30,435.06 180.58,456.72 190.86,436.93 201.13,410.31 211.41,431.33 221.69,424.10 231.97,465.20 242.25,303.33 252.52,278.72 262.80,415.50 273.08,402.25 283.36,421.77 293.64,387.79 303.91,464.93 314.19,366.11 324.47,369.48 334.75,403.48 345.03,442.59 355.30,455.71 365.58,482.95 375.86,454.04 386.14,412.42 396.42,419.70 406.69,450.92 416.97,456.65 427.25,470.39 437.53,492.12 447.81,490.79 458.08,392.91 468.36,399.74 478.64,419.97 488.92,461.56 499.20,453.23 509.47,500.01 519.75,470.09 530.03,410.53 540.31,425.65 550.59,480.37 560.86,465.74 571.14,493.40 581.42,471.69 591.70,486.61 601.98,360.09 612.25,446.86 622.53,456.11 632.81,464.61 643.09,487.91 653.37,478.52 663.64,504.31 673.92,399.91 684.20,467.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,520.58 88.08,515.13 98.35,487.01 108.63,480.61 118.91,490.89 129.19,467.39 139.47,483.88 149.74,498.85 160.02,480.93 170.30,358.96 180.58,398.34 190.86,448.24 201.13,480.34 211.41,409.79 221.69,419.82 231.97,446.15 242.25,386.07 252.52,252.10 262.80,371.91 273.08,360.34 283.36,376.85 293.64,476.24 303.91,455.34 314.19,383.34 324.47,413.87 334.75,439.73 345.03,443.74 355.30,433.88 365.58,463.78 375.86,461.93 386.14,284.30 396.42,360.21 406.69,463.53 416.97,453.40 427.25,464.81 437.53,444.45 447.81,478.84 458.08,428.33 468.36,443.89 478.64,449.47 488.92,473.98 499.20,442.78 509.47,480.25 519.75,470.24 530.03,450.11 540.31,455.10 550.59,487.35 560.86,479.75 571.14,497.75 581.42,461.96 591.70,501.02 601.98,426.83 612.25,441.28 622.53,486.29 632.81,488.11 643.09,456.25 653.37,449.12 663.64,486.69 673.92,461.17 684.20,426.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.51 88.08,516.50 98.35,469.65 108.63,488.18 118.91,486.00 129.19,501.88 139.47,501.11 149.74,495.51 160.02,498.04 170.30,464.93 180.58,425.53 190.86,403.21 201.13,461.91 211.41,475.53 221.69,452.15 231.97,490.62 242.25,399.08 252.52,308.00 262.80,442.78 273.08,464.86 283.36,480.76 293.64,446.27 303.91,470.22 314.19,406.30 324.47,380.27 334.75,338.31 345.03,386.10 355.30,442.83 365.58,483.54 375.86,436.54 386.14,394.23 396.42,330.81 406.69,427.49 416.97,394.55 427.25,481.79 437.53,479.83 447.81,497.67 458.08,426.66 468.36,376.71 478.64,445.81 488.92,450.43 499.20,472.21 509.47,493.40 519.75,499.69 530.03,403.55 540.31,413.55 550.59,432.21 560.86,472.31 571.14,481.72 581.42,485.04 591.70,487.57 601.98,432.75 612.25,444.06 622.53,441.18 632.81,489.71 643.09,497.35 653.37,506.89 663.64,495.61 673.92,462.94 684.20,447.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,500.21 88.08,511.46 98.35,461.22 108.63,487.35 118.91,479.07 129.19,478.13 139.47,499.62 149.74,487.18 160.02,484.47 170.30,500.01 180.58,413.70 190.86,427.69 201.13,482.06 211.41,443.50 221.69,454.73 231.97,486.42 242.25,424.52 252.52,423.63 262.80,378.11 273.08,403.75 283.36,451.75 293.64,464.96 303.91,433.76 314.19,300.75 324.47,181.43 334.75,387.82 345.03,459.45 355.30,435.41 365.58,400.94 375.86,500.08 386.14,338.53 396.42,311.44 406.69,423.78 416.97,443.47 427.25,446.52 437.53,468.35 447.81,495.68 458.08,440.55 468.36,412.45 478.64,429.07 488.92,457.75 499.20,492.44 509.47,493.10 519.75,496.44 530.03,422.50 540.31,401.68 550.59,461.86 560.86,478.16 571.14,490.72 581.42,485.55 591.70,505.74 601.98,449.64 612.25,473.04 622.53,467.29 632.81,489.78 643.09,498.56 653.37,471.72 663.64,494.60 673.92,486.24 684.20,442.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,506.94 88.08,517.34 98.35,490.64 108.63,494.26 118.91,471.81 129.19,497.65 139.47,491.31 149.74,491.75 160.02,506.92 170.30,440.18 180.58,441.63 190.86,386.81 201.13,453.33 211.41,446.84 221.69,477.25 231.97,450.72 242.25,393.00 252.52,375.87 262.80,375.38 273.08,422.92 283.36,370.02 293.64,427.32 303.91,478.82 314.19,331.35 324.47,359.57 334.75,372.82 345.03,358.86 355.30,442.07 365.58,463.16 375.86,445.17 386.14,394.80 396.42,432.36 406.69,389.96 416.97,451.73 427.25,468.81 437.53,473.29 447.81,491.70 458.08,423.09 468.36,402.52 478.64,451.04 488.92,480.34 499.20,467.29 509.47,483.10 519.75,486.32 530.03,393.72 540.31,460.31 550.59,432.21 560.86,473.21 571.14,484.28 581.42,492.02 591.70,493.13 601.98,384.79 612.25,462.23 622.53,370.34 632.81,457.85 643.09,494.13 653.37,457.48 663.64,499.96 673.92,396.37 684.20,357.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,504.75 88.08,514.66 98.35,488.97 108.63,478.30 118.91,474.52 129.19,498.85 139.47,509.01 149.74,479.88 160.02,458.07 170.30,345.37 180.58,365.35 190.86,440.55 201.13,471.30 211.41,483.37 221.69,468.59 231.97,430.30 242.25,444.70 252.52,356.26 262.80,351.07 273.08,377.30 283.36,426.21 293.64,423.58 303.91,463.85 314.19,362.45 324.47,299.74 334.75,425.28 345.03,430.93 355.30,433.32 365.58,411.00 375.86,444.58 386.14,433.44 396.42,383.57 406.69,429.73 416.97,472.45 427.25,459.74 437.53,417.07 447.81,474.05 458.08,445.24 468.36,378.23 478.64,419.90 488.92,477.34 499.20,491.77 509.47,460.06 519.75,493.69 530.03,437.01 540.31,426.04 550.59,438.46 560.86,450.85 571.14,506.65 581.42,483.59 591.70,488.75 601.98,461.00 612.25,447.31 622.53,432.41 632.81,455.22 643.09,491.13 653.37,492.56 663.64,496.37 673.92,465.37 684.20,443.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.71 88.08,513.58 98.35,514.61 108.63,499.57 118.91,499.37 129.19,495.98 139.47,485.26 149.74,461.44 160.02,483.71 170.30,431.11 180.58,419.87 190.86,429.88 201.13,430.32 211.41,468.89 221.69,467.86 231.97,422.95 242.25,380.37 252.52,439.86 262.80,409.18 273.08,377.64 283.36,448.68 293.64,450.62 303.91,379.78 314.19,377.32 324.47,443.86 334.75,414.98 345.03,439.34 355.30,452.71 365.58,446.74 375.86,478.13 386.14,355.62 396.42,398.34 406.69,460.31 416.97,401.83 427.25,478.89 437.53,450.89 447.81,474.27 458.08,409.18 468.36,415.69 478.64,478.28 488.92,477.91 499.20,492.73 509.47,472.21 519.75,464.09 530.03,386.37 540.31,399.03 550.59,462.87 560.86,443.99 571.14,464.19 581.42,489.59 591.70,481.38 601.98,463.16 612.25,433.15 622.53,440.03 632.81,468.86 643.09,492.98 653.37,482.26 663.64,481.77 673.92,438.19 684.20,423.81 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,507.46 88.08,516.70 98.35,473.17 108.63,498.02 118.91,509.55 129.19,492.36 139.47,505.27 149.74,485.26 160.02,485.87 170.30,379.88 180.58,386.52 190.86,453.40 201.13,416.36 211.41,466.77 221.69,426.80 231.97,435.41 242.25,362.23 252.52,365.25 262.80,257.19 273.08,394.80 283.36,425.99 293.64,399.40 303.91,456.50 314.19,316.48 324.47,149.25 334.75,395.56 345.03,424.79 355.30,422.55 365.58,430.25 375.86,461.42 386.14,458.96 396.42,429.34 406.69,454.02 416.97,467.46 427.25,454.70 437.53,465.96 447.81,444.97 458.08,457.24 468.36,401.39 478.64,391.70 488.92,460.14 499.20,486.24 509.47,466.41 519.75,503.01 530.03,426.21 540.31,373.98 550.59,480.69 560.86,473.12 571.14,485.51 581.42,493.20 591.70,495.73 601.98,464.76 612.25,430.84 622.53,471.05 632.81,458.17 643.09,492.59 653.37,472.28 663.64,492.66 673.92,432.88 684.20,456.77 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.68 88.08,510.38 98.35,490.08 108.63,505.96 118.91,497.92 129.19,464.44 139.47,492.44 149.74,483.93 160.02,482.06 170.30,420.24 180.58,440.05 190.86,395.49 201.13,430.74 211.41,455.98 221.69,457.48 231.97,442.12 242.25,289.22 252.52,406.89 262.80,381.13 273.08,389.98 283.36,392.44 293.64,424.10 303.91,469.01 314.19,401.19 324.47,370.22 334.75,422.60 345.03,446.32 355.30,468.84 365.58,445.71 375.86,446.96 386.14,395.76 396.42,413.48 406.69,413.78 416.97,439.39 427.25,460.09 437.53,482.24 447.81,485.85 458.08,430.47 468.36,427.44 478.64,475.38 488.92,442.22 499.20,463.48 509.47,451.16 519.75,494.38 530.03,376.36 540.31,441.53 550.59,442.83 560.86,480.22 571.14,491.43 581.42,493.49 591.70,496.94 601.98,442.64 612.25,461.34 622.53,436.17 632.81,476.63 643.09,494.45 653.37,483.49 663.64,499.94 673.92,436.88 684.20,463.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.14 88.08,514.02 98.35,459.57 108.63,498.61 118.91,469.58 129.19,487.82 139.47,494.08 149.74,486.61 160.02,503.33 170.30,475.21 180.58,425.33 190.86,477.89 201.13,392.37 211.41,472.85 221.69,468.37 231.97,453.52 242.25,404.39 252.52,434.60 262.80,359.48 273.08,382.88 283.36,455.66 293.64,448.81 303.91,454.16 314.19,364.39 324.47,383.91 334.75,354.24 345.03,447.26 355.30,431.16 365.58,464.68 375.86,487.67 386.14,363.88 396.42,419.75 406.69,402.25 416.97,461.10 427.25,458.59 437.53,488.06 447.81,499.20 458.08,424.40 468.36,444.53 478.64,461.83 488.92,487.89 499.20,471.17 509.47,500.35 519.75,503.97 530.03,463.85 540.31,485.41 550.59,462.91 560.86,472.67 571.14,485.58 581.42,503.77 591.70,503.35 601.98,464.51 612.25,478.60 622.53,483.05 632.81,474.86 643.09,493.84 653.37,488.95 663.64,505.24 673.92,442.05 684.20,466.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,521.20 88.08,513.48 98.35,489.68 108.63,484.99 118.91,467.76 129.19,467.59 139.47,497.55 149.74,485.11 160.02,499.86 170.30,358.34 180.58,437.65 190.86,405.52 201.13,395.09 211.41,440.67 221.69,489.02 231.97,460.28 242.25,289.34 252.52,423.41 262.80,404.61 273.08,438.53 283.36,410.02 293.64,456.94 303.91,478.99 314.19,430.12 324.47,390.69 334.75,385.06 345.03,338.43 355.30,424.81 365.58,475.50 375.86,437.52 386.14,441.46 396.42,379.66 406.69,456.01 416.97,396.40 427.25,414.71 437.53,437.72 447.81,449.94 458.08,318.50 468.36,483.29 478.64,425.28 488.92,421.94 499.20,488.06 509.47,460.06 519.75,485.16 530.03,439.96 540.31,451.29 550.59,435.83 560.86,490.00 571.14,482.56 581.42,487.55 591.70,479.80 601.98,452.05 612.25,472.60 622.53,484.23 632.81,456.11 643.09,493.05 653.37,488.11 663.64,507.78 673.92,450.43 684.20,448.53 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.44 88.08,514.07 98.35,481.30 108.63,483.12 118.91,497.97 129.19,496.35 139.47,499.00 149.74,498.09 160.02,493.79 170.30,453.70 180.58,406.30 190.86,412.50 201.13,445.44 211.41,473.26 221.69,448.83 231.97,459.20 242.25,320.73 252.52,338.09 262.80,389.86 273.08,460.85 283.36,474.69 293.64,346.59 303.91,452.52 314.19,336.61 324.47,341.68 334.75,407.36 345.03,380.52 355.30,443.20 365.58,436.29 375.86,447.11 386.14,397.21 396.42,363.21 406.69,421.64 416.97,458.20 427.25,466.43 437.53,426.56 447.81,449.91 458.08,437.06 468.36,370.59 478.64,455.52 488.92,468.45 499.20,454.75 509.47,485.11 519.75,482.26 530.03,401.17 540.31,450.16 550.59,451.85 560.86,456.92 571.14,480.59 581.42,491.33 591.70,491.16 601.98,389.71 612.25,465.08 622.53,487.45 632.81,486.64 643.09,489.44 653.37,493.15 663.64,493.40 673.92,475.33 684.20,422.23 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.54 88.08,517.56 98.35,502.27 108.63,500.03 118.91,490.62 129.19,493.57 139.47,483.91 149.74,489.09 160.02,501.70 170.30,484.28 180.58,466.41 190.86,451.93 201.13,453.57 211.41,439.12 221.69,493.22 231.97,452.66 242.25,332.56 252.52,364.00 262.80,384.20 273.08,454.53 283.36,429.31 293.64,353.01 303.91,395.19 314.19,89.52 324.47,322.23 334.75,306.67 345.03,407.95 355.30,426.51 365.58,387.23 375.86,479.31 386.14,399.20 396.42,407.97 406.69,397.23 416.97,446.40 427.25,464.86 437.53,488.82 447.81,499.05 458.08,419.06 468.36,454.98 478.64,454.21 488.92,456.35 499.20,476.58 509.47,486.96 519.75,499.35 530.03,460.65 540.31,427.22 550.59,481.52 560.86,476.21 571.14,481.82 581.42,480.00 591.70,489.98 601.98,434.67 612.25,499.03 622.53,452.64 632.81,451.51 643.09,490.27 653.37,459.40 663.64,503.03 673.92,382.31 684.20,480.56 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.19 88.08,520.51 98.35,490.72 108.63,502.61 118.91,500.35 129.19,496.10 139.47,490.30 149.74,491.92 160.02,487.64 170.30,469.48 180.58,379.39 190.86,449.89 201.13,433.66 211.41,486.17 221.69,446.00 231.97,456.47 242.25,263.21 252.52,338.92 262.80,429.66 273.08,448.63 283.36,457.58 293.64,411.93 303.91,442.41 314.19,369.90 324.47,334.30 334.75,396.86 345.03,429.88 355.30,425.01 365.58,458.05 375.86,468.67 386.14,403.33 396.42,386.69 406.69,417.91 416.97,396.30 427.25,450.18 437.53,481.13 447.81,501.95 458.08,403.01 468.36,421.20 478.64,468.99 488.92,441.87 499.20,495.53 509.47,494.43 519.75,468.10 530.03,439.46 540.31,470.90 550.59,486.96 560.86,487.10 571.14,499.59 581.42,467.88 591.70,486.51 601.98,430.05 612.25,443.37 622.53,459.23 632.81,464.73 643.09,491.92 653.37,469.21 663.64,496.94 673.92,441.85 684.20,457.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.23 88.08,515.03 98.35,492.95 108.63,485.46 118.91,504.51 129.19,482.58 139.47,501.34 149.74,498.39 160.02,497.77 170.30,469.67 180.58,378.30 190.86,454.90 201.13,419.72 211.41,476.04 221.69,487.79 231.97,430.30 242.25,381.60 252.52,282.76 262.80,409.11 273.08,428.33 283.36,437.37 293.64,472.97 303.91,476.21 314.19,331.23 324.47,423.31 334.75,378.21 345.03,439.66 355.30,414.02 365.58,472.43 375.86,482.68 386.14,369.31 396.42,385.34 406.69,440.62 416.97,444.04 427.25,478.84 437.53,490.77 447.81,491.16 458.08,379.44 468.36,416.55 478.64,465.45 488.92,481.87 499.20,478.97 509.47,504.95 519.75,483.05 530.03,403.70 540.31,442.44 550.59,453.16 560.86,457.88 571.14,473.85 581.42,490.99 591.70,499.47 601.98,413.85 612.25,433.32 622.53,455.10 632.81,434.45 643.09,493.96 653.37,495.17 663.64,494.55 673.92,424.13 684.20,409.55 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.35 88.08,516.90 98.35,487.62 108.63,493.74 118.91,484.79 129.19,490.74 139.47,488.16 149.74,496.40 160.02,488.46 170.30,453.45 180.58,438.60 190.86,434.13 201.13,463.31 211.41,472.40 221.69,453.25 231.97,472.72 242.25,431.35 252.52,305.13 262.80,420.29 273.08,377.74 283.36,427.54 293.64,443.05 303.91,442.34 314.19,364.10 324.47,323.09 334.75,410.36 345.03,446.00 355.30,470.46 365.58,463.60 375.86,480.32 386.14,364.74 396.42,410.36 406.69,386.66 416.97,449.42 427.25,473.24 437.53,476.56 447.81,456.25 458.08,434.60 468.36,399.22 478.64,476.39 488.92,446.84 499.20,477.34 509.47,478.67 519.75,498.09 530.03,385.24 540.31,424.94 550.59,484.33 560.86,470.09 571.14,499.22 581.42,471.59 591.70,501.21 601.98,451.75 612.25,450.60 622.53,480.22 632.81,492.90 643.09,469.33 653.37,462.47 663.64,476.12 673.92,457.53 684.20,448.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.98 88.08,514.09 98.35,492.02 108.63,494.94 118.91,467.09 129.19,468.42 139.47,499.39 149.74,496.40 160.02,480.69 170.30,402.05 180.58,394.21 190.86,365.35 201.13,458.79 211.41,458.39 221.69,447.85 231.97,471.30 242.25,405.47 252.52,324.89 262.80,364.71 273.08,392.66 283.36,359.60 293.64,446.15 303.91,456.87 314.19,336.98 324.47,300.26 334.75,321.84 345.03,408.66 355.30,424.57 365.58,463.09 375.86,490.13 386.14,361.32 396.42,376.39 406.69,321.84 416.97,402.79 427.25,475.70 437.53,461.15 447.81,484.94 458.08,396.30 468.36,398.86 478.64,431.87 488.92,407.90 499.20,458.74 509.47,482.75 519.75,482.65 530.03,473.78 540.31,451.53 550.59,494.67 560.86,486.02 571.14,493.42 581.42,505.32 591.70,495.81 601.98,460.63 612.25,442.09 622.53,427.98 632.81,466.18 643.09,472.77 653.37,487.77 663.64,494.08 673.92,428.67 684.20,477.76 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.36 88.08,515.59 98.35,484.52 108.63,506.79 118.91,476.21 129.19,496.74 139.47,504.78 149.74,495.12 160.02,499.54 170.30,437.10 180.58,399.37 190.86,463.65 201.13,394.41 211.41,442.86 221.69,468.40 231.97,467.81 242.25,369.87 252.52,325.33 262.80,351.88 273.08,327.59 283.36,444.36 293.64,464.09 303.91,448.81 314.19,329.56 324.47,315.67 334.75,424.84 345.03,427.64 355.30,462.77 365.58,445.39 375.86,471.47 386.14,435.09 396.42,298.19 406.69,387.52 416.97,446.32 427.25,489.88 437.53,480.52 447.81,463.48 458.08,432.63 468.36,421.62 478.64,444.97 488.92,439.93 499.20,478.01 509.47,478.67 519.75,504.16 530.03,423.95 540.31,359.03 550.59,424.49 560.86,442.24 571.14,448.61 581.42,473.12 591.70,489.61 601.98,439.37 612.25,432.68 622.53,467.91 632.81,447.97 643.09,489.66 653.37,487.74 663.64,500.06 673.92,412.40 684.20,460.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.38 88.08,512.62 98.35,498.61 108.63,505.42 118.91,458.22 129.19,490.18 139.47,499.52 149.74,499.42 160.02,495.95 170.30,395.39 180.58,477.15 190.86,427.57 201.13,458.49 211.41,469.53 221.69,477.44 231.97,472.92 242.25,334.18 252.52,399.79 262.80,440.10 273.08,390.74 283.36,414.83 293.64,406.92 303.91,442.83 314.19,267.07 324.47,337.67 334.75,376.95 345.03,428.67 355.30,387.55 365.58,458.59 375.86,448.12 386.14,312.94 396.42,416.09 406.69,386.88 416.97,352.22 427.25,433.56 437.53,475.16 447.81,495.68 458.08,407.58 468.36,414.07 478.64,467.68 488.92,446.72 499.20,455.20 509.47,452.76 519.75,479.80 530.03,433.83 540.31,468.42 550.59,437.84 560.86,472.94 571.14,477.81 581.42,471.08 591.70,502.15 601.98,422.72 612.25,457.46 622.53,463.78 632.81,477.49 643.09,495.85 653.37,490.23 663.64,495.76 673.92,455.64 684.20,480.52 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,507.63 88.08,507.53 98.35,490.30 108.63,476.98 118.91,473.19 129.19,495.02 139.47,491.95 149.74,486.39 160.02,503.87 170.30,414.44 180.58,367.86 190.86,396.18 201.13,422.50 211.41,468.10 221.69,474.98 231.97,442.76 242.25,409.47 252.52,362.72 262.80,348.17 273.08,321.74 283.36,444.18 293.64,479.83 303.91,459.60 314.19,277.47 324.47,396.08 334.75,299.35 345.03,411.12 355.30,444.21 365.58,423.85 375.86,497.62 386.14,392.37 396.42,377.91 406.69,399.94 416.97,413.80 427.25,455.25 437.53,455.37 447.81,493.03 458.08,406.75 468.36,423.98 478.64,425.23 488.92,423.22 499.20,492.88 509.47,476.95 519.75,500.55 530.03,430.27 540.31,447.40 550.59,446.52 560.86,478.50 571.14,508.10 581.42,480.15 591.70,509.84 601.98,461.96 612.25,470.19 622.53,465.42 632.81,476.98 643.09,494.63 653.37,496.52 663.64,499.71 673.92,450.82 684.20,412.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.70 88.08,513.43 98.35,473.51 108.63,498.19 118.91,486.34 129.19,497.45 139.47,495.51 149.74,469.55 160.02,497.65 170.30,465.62 180.58,397.16 190.86,411.47 201.13,438.82 211.41,393.40 221.69,470.88 231.97,469.95 242.25,402.44 252.52,373.95 262.80,261.39 273.08,413.33 283.36,423.46 293.64,459.77 303.91,441.70 314.19,334.84 324.47,330.15 334.75,314.27 345.03,395.14 355.30,430.30 365.58,412.40 375.86,429.51 386.14,395.04 396.42,381.35 406.69,416.11 416.97,481.18 427.25,450.35 437.53,419.63 447.81,487.89 458.08,452.44 468.36,413.95 478.64,430.47 488.92,474.22 499.20,476.85 509.47,466.85 519.75,491.31 530.03,459.62 540.31,377.91 550.59,471.59 560.86,477.89 571.14,504.51 581.42,494.72 591.70,505.15 601.98,430.30 612.25,432.75 622.53,435.65 632.81,469.11 643.09,470.73 653.37,469.01 663.64,457.88 673.92,396.74 684.20,420.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.78 88.08,511.56 98.35,486.22 108.63,478.50 118.91,488.28 129.19,505.12 139.47,496.00 149.74,495.29 160.02,505.91 170.30,444.99 180.58,428.92 190.86,443.67 201.13,436.74 211.41,423.24 221.69,437.15 231.97,464.98 242.25,382.09 252.52,421.03 262.80,422.26 273.08,377.49 283.36,420.31 293.64,472.97 303.91,463.38 314.19,406.82 324.47,391.38 334.75,422.55 345.03,392.56 355.30,419.90 365.58,412.13 375.86,473.12 386.14,334.52 396.42,451.88 406.69,430.27 416.97,423.83 427.25,445.14 437.53,467.83 447.81,494.90 458.08,411.02 468.36,472.70 478.64,435.90 488.92,437.25 499.20,490.37 509.47,494.28 519.75,487.79 530.03,434.79 540.31,477.69 550.59,428.21 560.86,487.74 571.14,474.71 581.42,473.78 591.70,494.55 601.98,422.33 612.25,448.76 622.53,454.21 632.81,465.25 643.09,475.38 653.37,472.55 663.64,493.49 673.92,362.87 684.20,486.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.65 88.08,515.67 98.35,485.92 108.63,474.42 118.91,482.92 129.19,456.92 139.47,504.09 149.74,497.43 160.02,479.43 170.30,467.76 180.58,441.60 190.86,442.76 201.13,446.76 211.41,438.06 221.69,491.04 231.97,436.49 242.25,334.08 252.52,305.69 262.80,297.09 273.08,421.25 283.36,456.84 293.64,450.26 303.91,480.76 314.19,379.93 324.47,334.33 334.75,257.98 345.03,400.38 355.30,462.10 365.58,459.84 375.86,458.27 386.14,370.07 396.42,375.01 406.69,249.10 416.97,416.01 427.25,478.40 437.53,442.14 447.81,474.91 458.08,452.32 468.36,485.38 478.64,409.82 488.92,465.86 499.20,476.04 509.47,482.51 519.75,480.49 530.03,430.54 540.31,461.15 550.59,403.94 560.86,462.77 571.14,505.29 581.42,489.07 591.70,484.82 601.98,456.16 612.25,474.44 622.53,432.63 632.81,479.93 643.09,462.67 653.37,485.85 663.64,504.58 673.92,412.92 684.20,400.75 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.74 88.08,518.96 98.35,488.85 108.63,488.55 118.91,489.14 129.19,496.84 139.47,483.15 149.74,473.68 160.02,507.09 170.30,477.52 180.58,429.02 190.86,448.68 201.13,468.45 211.41,462.40 221.69,445.12 231.97,471.79 242.25,397.01 252.52,354.04 262.80,415.52 273.08,410.56 283.36,457.06 293.64,437.42 303.91,480.96 314.19,359.40 324.47,322.65 334.75,449.99 345.03,440.42 355.30,430.32 365.58,419.26 375.86,461.54 386.14,433.61 396.42,397.13 406.69,419.04 416.97,428.55 427.25,442.88 437.53,471.17 447.81,474.59 458.08,438.36 468.36,455.10 478.64,425.45 488.92,473.39 499.20,474.91 509.47,471.52 519.75,497.08 530.03,469.77 540.31,487.91 550.59,437.92 560.86,474.27 571.14,489.81 581.42,466.73 591.70,506.84 601.98,491.26 612.25,424.15 622.53,501.53 632.81,473.71 643.09,479.53 653.37,453.38 663.64,506.45 673.92,424.00 684.20,423.68 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.83 88.08,521.32 98.35,475.40 108.63,491.60 118.91,494.75 129.19,506.79 139.47,495.81 149.74,501.61 160.02,494.33 170.30,402.44 180.58,458.88 190.86,436.76 201.13,443.54 211.41,465.45 221.69,467.09 231.97,460.92 242.25,337.25 252.52,358.17 262.80,397.85 273.08,458.10 283.36,406.99 293.64,428.87 303.91,494.16 314.19,386.12 324.47,379.56 334.75,358.57 345.03,454.85 355.30,464.37 365.58,498.63 375.86,476.98 386.14,336.22 396.42,304.09 406.69,406.87 416.97,456.97 427.25,448.93 437.53,452.44 447.81,483.34 458.08,413.63 468.36,413.06 478.64,414.19 488.92,477.61 499.20,464.88 509.47,469.95 519.75,470.29 530.03,421.99 540.31,459.94 550.59,480.00 560.86,492.98 571.14,489.14 581.42,474.69 591.70,486.07 601.98,474.03 612.25,458.27 622.53,474.91 632.81,433.42 643.09,488.26 653.37,477.76 663.64,482.95 673.92,415.50 684.20,400.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,518.15 88.08,518.64 98.35,489.12 108.63,479.46 118.91,492.93 129.19,484.06 139.47,494.08 149.74,494.16 160.02,488.38 170.30,416.21 180.58,478.11 190.86,450.89 201.13,406.40 211.41,447.04 221.69,456.70 231.97,473.09 242.25,288.66 252.52,361.47 262.80,445.02 273.08,447.48 283.36,389.00 293.64,461.49 303.91,454.39 314.19,287.08 324.47,336.02 334.75,399.81 345.03,407.14 355.30,499.10 365.58,454.95 375.86,440.72 386.14,310.68 396.42,401.07 406.69,426.34 416.97,456.77 427.25,412.03 437.53,452.44 447.81,472.82 458.08,390.45 468.36,392.59 478.64,326.98 488.92,421.18 499.20,480.10 509.47,465.32 519.75,477.25 530.03,376.36 540.31,444.13 550.59,454.04 560.86,486.76 571.14,471.47 581.42,488.21 591.70,492.02 601.98,420.14 612.25,441.75 622.53,469.99 632.81,480.15 643.09,484.77 653.37,487.08 663.64,479.70 673.92,393.84 684.20,375.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.47 88.08,518.74 98.35,455.57 108.63,488.14 118.91,482.83 129.19,475.84 139.47,504.38 149.74,503.30 160.02,504.73 170.30,438.26 180.58,405.79 190.86,411.56 201.13,454.95 211.41,387.42 221.69,486.49 231.97,428.82 242.25,181.04 252.52,317.81 262.80,419.58 273.08,403.40 283.36,404.29 293.64,427.79 303.91,438.70 314.19,180.23 324.47,367.91 334.75,470.36 345.03,411.81 355.30,438.46 365.58,481.84 375.86,447.97 386.14,351.71 396.42,478.33 406.69,441.80 416.97,407.93 427.25,463.23 437.53,494.58 447.81,486.59 458.08,349.67 468.36,411.86 478.64,483.64 488.92,427.07 499.20,469.65 509.47,498.76 519.75,474.64 530.03,391.73 540.31,487.28 550.59,478.50 560.86,465.55 571.14,492.73 581.42,497.21 591.70,494.97 601.98,455.00 612.25,484.23 622.53,490.00 632.81,465.18 643.09,494.53 653.37,488.60 663.64,490.47 673.92,440.08 684.20,453.52 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,506.50 88.08,509.52 98.35,468.50 108.63,484.52 118.91,472.60 129.19,489.27 139.47,491.09 149.74,470.61 160.02,507.41 170.30,397.95 180.58,381.57 190.86,423.71 201.13,436.66 211.41,456.57 221.69,433.39 231.97,466.68 242.25,351.98 252.52,326.44 262.80,401.58 273.08,394.48 283.36,439.29 293.64,397.48 303.91,439.29 314.19,381.01 324.47,369.01 334.75,335.04 345.03,416.01 355.30,455.22 365.58,449.52 375.86,451.34 386.14,375.85 396.42,406.79 406.69,407.04 416.97,440.18 427.25,468.69 437.53,461.37 447.81,467.59 458.08,402.10 468.36,447.45 478.64,424.94 488.92,455.02 499.20,475.21 509.47,457.26 519.75,503.45 530.03,488.11 540.31,470.68 550.59,483.61 560.86,419.55 571.14,487.84 581.42,470.78 591.70,502.47 601.98,464.46 612.25,421.49 622.53,488.26 632.81,495.83 643.09,456.01 653.37,449.40 663.64,476.53 673.92,397.68 684.20,400.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,504.21 88.08,505.49 98.35,489.14 108.63,503.40 118.91,501.95 129.19,496.69 139.47,497.89 149.74,498.24 160.02,503.67 170.30,451.68 180.58,416.28 190.86,465.89 201.13,489.73 211.41,489.66 221.69,448.12 231.97,460.36 242.25,261.47 252.52,396.74 262.80,353.45 273.08,404.12 283.36,428.25 293.64,389.10 303.91,426.41 314.19,381.40 324.47,369.70 334.75,380.74 345.03,449.10 355.30,405.25 365.58,448.14 375.86,476.46 386.14,406.62 396.42,378.65 406.69,239.25 416.97,442.68 427.25,472.16 437.53,481.01 447.81,458.22 458.08,397.53 468.36,465.42 478.64,463.87 488.92,463.82 499.20,482.58 509.47,492.63 519.75,492.86 530.03,306.58 540.31,451.56 550.59,402.42 560.86,475.82 571.14,480.52 581.42,495.29 591.70,495.85 601.98,490.84 612.25,449.71 622.53,456.57 632.81,491.97 643.09,501.98 653.37,486.12 663.64,501.07 673.92,379.88 684.20,438.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,516.43 88.08,510.75 98.35,491.09 108.63,503.23 118.91,507.73 129.19,495.34 139.47,493.18 149.74,498.31 160.02,500.94 170.30,463.06 180.58,464.73 190.86,492.49 201.13,430.71 211.41,465.18 221.69,438.97 231.97,474.81 242.25,324.82 252.52,372.11 262.80,371.77 273.08,440.05 283.36,465.30 293.64,461.02 303.91,460.11 314.19,285.31 324.47,397.72 334.75,441.80 345.03,430.57 355.30,464.22 365.58,442.95 375.86,459.67 386.14,335.80 396.42,418.37 406.69,430.98 416.97,450.57 427.25,460.92 437.53,466.14 447.81,473.41 458.08,403.21 468.36,455.93 478.64,466.16 488.92,467.46 499.20,462.28 509.47,487.18 519.75,497.43 530.03,439.93 540.31,451.63 550.59,479.95 560.86,475.67 571.14,481.42 581.42,502.66 591.70,500.23 601.98,461.44 612.25,457.21 622.53,473.34 632.81,452.42 643.09,477.74 653.37,481.74 663.64,497.45 673.92,367.44 684.20,468.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,519.38 88.08,515.05 98.35,482.26 108.63,490.72 118.91,476.14 129.19,486.54 139.47,475.28 149.74,502.91 160.02,496.79 170.30,416.92 180.58,464.86 190.86,458.49 201.13,383.20 211.41,438.19 221.69,442.46 231.97,452.69 242.25,260.73 252.52,397.63 262.80,432.36 273.08,395.04 283.36,409.79 293.64,426.51 303.91,427.15 314.19,256.33 324.47,392.93 334.75,393.77 345.03,370.54 355.30,459.67 365.58,449.20 375.86,465.42 386.14,361.96 396.42,356.21 406.69,388.90 416.97,370.68 427.25,419.06 437.53,465.23 447.81,497.82 458.08,395.88 468.36,411.49 478.64,415.55 488.92,480.96 499.20,413.36 509.47,466.01 519.75,491.11 530.03,409.20 540.31,424.17 550.59,423.39 560.86,471.94 571.14,472.87 581.42,471.81 591.70,495.83 601.98,423.07 612.25,427.59 622.53,481.82 632.81,459.74 643.09,490.59 653.37,499.98 663.64,501.02 673.92,454.85 684.20,414.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,516.82 88.08,517.83 98.35,487.74 108.63,489.29 118.91,494.70 129.19,500.48 139.47,488.95 149.74,489.91 160.02,486.19 170.30,445.61 180.58,467.34 190.86,431.45 201.13,480.44 211.41,491.26 221.69,460.78 231.97,459.33 242.25,332.36 252.52,366.75 262.80,409.97 273.08,382.80 283.36,443.82 293.64,453.40 303.91,443.42 314.19,302.79 324.47,323.09 334.75,358.91 345.03,356.01 355.30,436.56 365.58,390.10 375.86,401.76 386.14,90.11 396.42,256.72 406.69,419.38 416.97,400.90 427.25,458.47 437.53,487.03 447.81,479.21 458.08,370.66 468.36,381.72 478.64,425.21 488.92,489.14 499.20,459.06 509.47,459.77 519.75,483.98 530.03,429.73 540.31,470.85 550.59,476.46 560.86,471.52 571.14,489.07 581.42,486.54 591.70,492.59 601.98,455.96 612.25,404.41 622.53,460.90 632.81,481.20 643.09,490.69 653.37,490.08 663.64,506.74 673.92,428.01 684.20,446.94 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,516.18 88.08,518.30 98.35,486.59 108.63,483.56 118.91,495.68 129.19,493.22 139.47,483.02 149.74,499.30 160.02,495.81 170.30,413.19 180.58,394.11 190.86,389.07 201.13,485.60 211.41,470.14 221.69,390.20 231.97,468.86 242.25,263.11 252.52,300.77 262.80,352.62 273.08,309.43 283.36,438.51 293.64,425.62 303.91,451.12 314.19,309.92 324.47,351.17 334.75,411.61 345.03,372.43 355.30,440.25 365.58,374.15 375.86,474.86 386.14,342.24 396.42,364.34 406.69,438.36 416.97,408.25 427.25,464.17 437.53,457.11 447.81,493.89 458.08,374.57 468.36,443.54 478.64,414.49 488.92,492.95 499.20,487.74 509.47,490.91 519.75,497.26 530.03,434.97 540.31,449.20 550.59,459.87 560.86,465.37 571.14,485.87 581.42,501.90 591.70,500.23 601.98,448.71 612.25,482.75 622.53,425.38 632.81,473.34 643.09,481.77 653.37,481.97 663.64,489.76 673.92,444.38 684.20,409.55 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,506.60 88.08,512.72 98.35,480.98 108.63,484.69 118.91,494.58 129.19,487.60 139.47,506.87 149.74,485.28 160.02,500.55 170.30,434.72 180.58,382.53 190.86,466.04 201.13,444.26 211.41,440.35 221.69,414.49 231.97,440.52 242.25,366.95 252.52,303.55 262.80,396.47 273.08,426.26 283.36,431.20 293.64,440.69 303.91,472.97 314.19,307.85 324.47,371.59 334.75,423.98 345.03,412.03 355.30,465.37 365.58,465.23 375.86,466.36 386.14,422.16 396.42,390.25 406.69,466.21 416.97,393.96 427.25,442.07 437.53,457.33 447.81,465.30 458.08,410.61 468.36,426.66 478.64,393.84 488.92,457.78 499.20,496.64 509.47,474.08 519.75,483.02 530.03,453.43 540.31,455.22 550.59,450.77 560.86,493.79 571.14,486.61 581.42,500.38 591.70,507.56 601.98,459.38 612.25,438.36 622.53,490.42 632.81,458.96 643.09,487.72 653.37,508.69 663.64,492.34 673.92,394.04 684.20,456.06 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,517.36 88.08,512.84 98.35,503.70 108.63,473.49 118.91,468.03 129.19,503.55 139.47,488.97 149.74,500.55 160.02,490.64 170.30,422.75 180.58,458.22 190.86,430.84 201.13,421.89 211.41,463.01 221.69,443.05 231.97,490.25 242.25,439.69 252.52,309.82 262.80,379.85 273.08,425.18 283.36,418.57 293.64,438.90 303.91,426.76 314.19,292.59 324.47,355.54 334.75,444.28 345.03,431.40 355.30,447.97 365.58,480.20 375.86,473.83 386.14,458.54 396.42,395.04 406.69,430.59 416.97,458.24 427.25,458.49 437.53,456.30 447.81,487.32 458.08,381.06 468.36,410.48 478.64,444.26 488.92,479.90 499.20,466.68 509.47,475.92 519.75,477.54 530.03,437.60 540.31,457.65 550.59,452.37 560.86,466.65 571.14,476.75 581.42,468.72 591.70,499.10 601.98,441.18 612.25,434.42 622.53,457.92 632.81,482.63 643.09,456.06 653.37,496.37 663.64,495.19 673.92,421.42 684.20,416.04 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,516.11 88.08,516.70 98.35,496.27 108.63,486.14 118.91,486.96 129.19,504.43 139.47,511.76 149.74,488.53 160.02,492.83 170.30,401.19 180.58,404.53 190.86,442.49 201.13,342.64 211.41,462.01 221.69,448.04 231.97,482.53 242.25,371.64 252.52,372.31 262.80,433.66 273.08,348.39 283.36,411.96 293.64,410.26 303.91,457.14 314.19,371.59 324.47,440.35 334.75,436.64 345.03,478.70 355.30,442.17 365.58,480.12 375.86,464.71 386.14,324.05 396.42,421.13 406.69,409.33 416.97,409.43 427.25,497.21 437.53,448.26 447.81,495.04 458.08,417.12 468.36,326.19 478.64,469.70 488.92,440.50 499.20,493.54 509.47,477.42 519.75,481.60 530.03,431.28 540.31,421.22 550.59,495.24 560.86,457.53 571.14,489.91 581.42,485.78 591.70,488.80 601.98,400.45 612.25,439.81 622.53,472.40 632.81,494.94 643.09,504.29 653.37,502.57 663.64,499.59 673.92,418.55 684.20,363.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,502.27 88.08,517.51 98.35,482.19 108.63,477.02 118.91,477.64 129.19,493.94 139.47,488.90 149.74,491.95 160.02,480.64 170.30,418.57 180.58,463.48 190.86,480.27 201.13,458.49 211.41,482.70 221.69,455.22 231.97,454.75 242.25,395.68 252.52,312.65 262.80,334.94 273.08,400.72 283.36,411.74 293.64,378.67 303.91,408.47 314.19,309.06 324.47,287.21 334.75,370.41 345.03,366.19 355.30,438.01 365.58,445.09 375.86,472.48 386.14,308.44 396.42,456.57 406.69,416.06 416.97,478.67 427.25,474.00 437.53,436.47 447.81,468.00 458.08,434.67 468.36,469.60 478.64,456.45 488.92,459.72 499.20,465.35 509.47,455.52 519.75,501.93 530.03,432.63 540.31,494.35 550.59,493.25 560.86,478.48 571.14,456.38 581.42,497.03 591.70,492.93 601.98,460.21 612.25,462.10 622.53,494.87 632.81,443.79 643.09,486.78 653.37,474.30 663.64,485.80 673.92,455.81 684.20,363.56 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,503.20 88.08,519.87 98.35,474.52 108.63,480.96 118.91,500.50 129.19,480.64 139.47,490.59 149.74,495.39 160.02,504.53 170.30,434.94 180.58,451.61 190.86,469.18 201.13,412.96 211.41,464.44 221.69,444.48 231.97,464.98 242.25,388.26 252.52,323.93 262.80,387.94 273.08,357.95 283.36,420.36 293.64,417.41 303.91,492.76 314.19,338.46 324.47,364.76 334.75,417.93 345.03,424.99 355.30,446.69 365.58,441.63 375.86,476.58 386.14,410.24 396.42,422.18 406.69,344.11 416.97,372.23 427.25,467.83 437.53,436.29 447.81,480.34 458.08,412.67 468.36,348.54 478.64,420.17 488.92,467.88 499.20,487.40 509.47,486.98 519.75,501.66 530.03,451.12 540.31,404.58 550.59,465.50 560.86,454.88 571.14,491.28 581.42,505.44 591.70,503.79 601.98,439.88 612.25,464.09 622.53,415.47 632.81,471.69 643.09,482.51 653.37,486.71 663.64,488.80 673.92,380.32 684.20,416.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.96 88.08,505.98 98.35,489.24 108.63,462.69 118.91,505.91 129.19,492.76 139.47,505.74 149.74,471.89 160.02,486.22 170.30,392.54 180.58,443.50 190.86,392.56 201.13,424.20 211.41,408.54 221.69,444.95 231.97,481.42 242.25,359.48 252.52,363.63 262.80,376.83 273.08,433.83 283.36,430.39 293.64,462.69 303.91,486.34 314.19,362.72 324.47,367.19 334.75,400.72 345.03,369.97 355.30,457.41 365.58,439.83 375.86,474.74 386.14,456.23 396.42,392.76 406.69,388.36 416.97,432.63 427.25,497.06 437.53,473.66 447.81,476.53 458.08,433.91 468.36,476.95 478.64,444.04 488.92,454.75 499.20,492.29 509.47,455.44 519.75,477.86 530.03,426.44 540.31,454.70 550.59,471.62 560.86,480.37 571.14,490.84 581.42,496.62 591.70,505.05 601.98,474.44 612.25,453.45 622.53,469.85 632.81,482.53 643.09,497.87 653.37,472.13 663.64,476.14 673.92,374.08 684.20,455.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,504.06 88.08,515.05 98.35,446.49 108.63,486.19 118.91,497.75 129.19,467.56 139.47,504.97 149.74,485.73 160.02,497.67 170.30,448.63 180.58,419.55 190.86,468.30 201.13,481.97 211.41,452.25 221.69,457.88 231.97,479.34 242.25,278.63 252.52,404.80 262.80,376.85 273.08,407.85 283.36,429.24 293.64,450.48 303.91,484.74 314.19,332.95 324.47,401.98 334.75,435.16 345.03,426.19 355.30,431.52 365.58,410.26 375.86,475.21 386.14,321.20 396.42,416.55 406.69,429.39 416.97,426.85 427.25,438.63 437.53,417.76 447.81,455.66 458.08,403.80 468.36,383.57 478.64,468.74 488.92,467.59 499.20,467.51 509.47,470.19 519.75,495.49 530.03,415.47 540.31,392.00 550.59,485.38 560.86,485.36 571.14,480.56 581.42,491.68 591.70,507.38 601.98,419.92 612.25,483.15 622.53,455.76 632.81,488.11 643.09,480.25 653.37,490.96 663.64,510.31 673.92,473.14 684.20,439.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.26 88.08,509.23 98.35,473.85 108.63,494.01 118.91,474.79 129.19,475.25 139.47,508.93 149.74,504.31 160.02,506.69 170.30,357.93 180.58,454.21 190.86,457.19 201.13,466.21 211.41,445.39 221.69,455.88 231.97,461.19 242.25,399.47 252.52,318.74 262.80,415.91 273.08,431.77 283.36,445.71 293.64,424.47 303.91,441.58 314.19,305.08 324.47,267.05 334.75,410.73 345.03,422.67 355.30,402.98 365.58,469.36 375.86,427.84 386.14,402.20 396.42,289.98 406.69,400.77 416.97,420.27 427.25,479.68 437.53,428.97 447.81,440.35 458.08,421.00 468.36,457.11 478.64,458.59 488.92,471.44 499.20,474.47 509.47,486.59 519.75,485.16 530.03,422.08 540.31,460.14 550.59,448.44 560.86,483.81 571.14,494.87 581.42,484.57 591.70,480.27 601.98,463.06 612.25,426.98 622.53,466.80 632.81,469.53 643.09,481.30 653.37,497.33 663.64,485.92 673.92,407.46 684.20,430.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,512.23 88.08,503.50 98.35,502.71 108.63,465.86 118.91,478.13 129.19,484.52 139.47,511.39 149.74,476.31 160.02,494.21 170.30,450.45 180.58,423.24 190.86,439.66 201.13,400.28 211.41,499.47 221.69,425.03 231.97,402.30 242.25,355.96 252.52,286.44 262.80,416.21 273.08,371.27 283.36,383.05 293.64,432.68 303.91,446.81 314.19,374.42 324.47,316.09 334.75,407.26 345.03,436.51 355.30,464.76 365.58,410.11 375.86,470.46 386.14,363.75 396.42,419.16 406.69,439.66 416.97,450.16 427.25,472.31 437.53,467.22 447.81,459.65 458.08,368.32 468.36,430.61 478.64,439.59 488.92,475.99 499.20,467.71 509.47,479.24 519.75,482.88 530.03,418.03 540.31,459.60 550.59,477.05 560.86,480.27 571.14,494.99 581.42,470.83 591.70,475.65 601.98,461.00 612.25,464.32 622.53,399.74 632.81,406.84 643.09,491.21 653.37,479.07 663.64,440.47 673.92,418.27 684.20,431.23 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,518.96 88.08,516.31 98.35,504.26 108.63,505.74 118.91,482.06 129.19,490.08 139.47,468.30 149.74,498.09 160.02,495.49 170.30,445.34 180.58,402.17 190.86,408.96 201.13,483.98 211.41,469.48 221.69,487.84 231.97,453.72 242.25,405.10 252.52,353.28 262.80,389.17 273.08,388.70 283.36,439.24 293.64,420.68 303.91,425.11 314.19,443.69 324.47,360.29 334.75,414.27 345.03,383.22 355.30,450.16 365.58,442.83 375.86,443.89 386.14,376.09 396.42,367.32 406.69,400.18 416.97,434.94 427.25,453.67 437.53,498.83 447.81,486.96 458.08,420.02 468.36,419.72 478.64,467.56 488.92,437.62 499.20,482.33 509.47,493.94 519.75,494.99 530.03,427.22 540.31,445.83 550.59,486.73 560.86,489.34 571.14,473.44 581.42,502.96 591.70,505.52 601.98,460.83 612.25,450.80 622.53,481.99 632.81,454.02 643.09,455.07 653.37,478.20 663.64,496.08 673.92,365.33 684.20,410.92 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.81 88.08,513.80 98.35,493.22 108.63,478.23 118.91,475.92 129.19,467.29 139.47,491.06 149.74,482.04 160.02,499.07 170.30,445.41 180.58,375.94 190.86,353.11 201.13,471.64 211.41,447.28 221.69,472.99 231.97,472.97 242.25,139.42 252.52,408.56 262.80,278.06 273.08,353.85 283.36,432.11 293.64,449.62 303.91,440.47 314.19,424.13 324.47,332.29 334.75,351.61 345.03,384.11 355.30,477.10 365.58,429.51 375.86,450.60 386.14,369.77 396.42,358.52 406.69,438.75 416.97,394.06 427.25,422.82 437.53,434.50 447.81,460.41 458.08,380.15 468.36,421.42 478.64,471.15 488.92,449.84 499.20,478.94 509.47,487.45 519.75,491.82 530.03,405.30 540.31,400.99 550.59,447.58 560.86,480.84 571.14,497.40 581.42,442.44 591.70,502.42 601.98,442.88 612.25,458.10 622.53,456.50 632.81,497.58 643.09,491.18 653.37,472.31 663.64,496.52 673.92,409.47 684.20,459.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,512.67 88.08,516.82 98.35,491.45 108.63,507.06 118.91,491.33 129.19,501.46 139.47,497.67 149.74,488.68 160.02,503.67 170.30,435.88 180.58,456.97 190.86,456.62 201.13,477.15 211.41,479.41 221.69,439.00 231.97,461.42 242.25,233.57 252.52,393.15 262.80,425.43 273.08,421.35 283.36,462.01 293.64,441.63 303.91,474.25 314.19,330.22 324.47,290.18 334.75,401.56 345.03,394.06 355.30,440.79 365.58,464.86 375.86,469.75 386.14,393.96 396.42,374.08 406.69,424.25 416.97,435.01 427.25,467.14 437.53,476.39 447.81,493.91 458.08,404.78 468.36,428.21 478.64,409.35 488.92,478.03 499.20,493.79 509.47,470.07 519.75,501.85 530.03,412.08 540.31,457.65 550.59,448.36 560.86,481.79 571.14,475.75 581.42,475.92 591.70,485.73 601.98,417.93 612.25,471.54 622.53,478.48 632.81,489.88 643.09,490.86 653.37,497.30 663.64,506.82 673.92,452.69 684.20,454.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<rect x='47.48' y='22.78' width='667.04' height='522.33' style='stroke-width: 1.07; stroke: #333333;' /> </g> <g clip-path='url(#cpMC4wMHw3MjAuMDB8MC4wMHw1NzYuMDA=)'> -<text x='37.65' y='393.28' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>1000</text> -<text x='37.65' y='184.84' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>2000</text> -<polyline points='39.84,390.26 42.58,390.26 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='39.84,181.81 42.58,181.81 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='45.50,547.85 45.50,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='324.83,547.85 324.83,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='607.24,547.85 607.24,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<text x='45.50' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='13.70px' lengthAdjust='spacingAndGlyphs'>Apr</text> -<text x='324.83' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='11.25px' lengthAdjust='spacingAndGlyphs'>Jul</text> -<text x='607.24' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='13.70px' lengthAdjust='spacingAndGlyphs'>Oct</text> -<text x='378.55' y='568.24' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='75.23px' lengthAdjust='spacingAndGlyphs'>Reference date</text> +<text x='42.55' y='529.41' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='4.89px' lengthAdjust='spacingAndGlyphs'>0</text> +<text x='42.55' y='406.50' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>5000</text> +<text x='42.55' y='283.60' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='24.47px' lengthAdjust='spacingAndGlyphs'>10000</text> +<text x='42.55' y='160.69' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='24.47px' lengthAdjust='spacingAndGlyphs'>15000</text> +<text x='42.55' y='37.78' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='24.47px' lengthAdjust='spacingAndGlyphs'>20000</text> +<polyline points='44.74,526.38 47.48,526.38 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,403.48 47.48,403.48 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,280.57 47.48,280.57 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,157.66 47.48,157.66 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,34.75 47.48,34.75 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='129.19,547.85 129.19,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='273.08,547.85 273.08,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='416.97,547.85 416.97,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='591.70,547.85 591.70,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<text x='129.19' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.40px' lengthAdjust='spacingAndGlyphs'>Feb 15</text> +<text x='273.08' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 01</text> +<text x='416.97' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 15</text> +<text x='591.70' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='25.93px' lengthAdjust='spacingAndGlyphs'>Apr 01</text> +<text x='381.00' y='568.24' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='75.23px' lengthAdjust='spacingAndGlyphs'>Reference date</text> <text transform='translate(13.05,283.95) rotate(-90)' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='31.19px' lengthAdjust='spacingAndGlyphs'>Cases</text> -<text x='42.58' y='14.56' style='font-size: 13.20px; font-family: sans;' textLength='63.13px' lengthAdjust='spacingAndGlyphs'>obs_cases</text> +<text x='47.48' y='14.56' style='font-size: 13.20px; font-family: sans;' textLength='63.13px' lengthAdjust='spacingAndGlyphs'>obs_cases</text> </g> </svg> diff --git a/tests/testthat/_snaps/plot/r.svg b/tests/testthat/_snaps/plot/r.svg index 6224389..d8ad3c1 100644 --- a/tests/testthat/_snaps/plot/r.svg +++ b/tests/testthat/_snaps/plot/r.svg @@ -18,144 +18,154 @@ </clipPath> </defs> <g clip-path='url(#cpMC4wMHw3MjAuMDB8MC4wMHw1NzYuMDA=)'> -<rect x='0.00' y='0.00' width='720.00' height='576.00' style='stroke-width: 1.07; stroke: #FFFFFF; fill: #FFFFFF;' /> +<rect x='-0.000000000000064' y='0.00' width='720.00' height='576.00' style='stroke-width: 1.07; stroke: #FFFFFF; fill: #FFFFFF;' /> </g> <defs> - <clipPath id='cpNDMuMDZ8NzE0LjUyfDIyLjc4fDU0NS4xMQ=='> - <rect x='43.06' y='22.78' width='671.46' height='522.33' /> + <clipPath id='cpMzguMTd8NzE0LjUyfDIyLjc4fDU0NS4xMQ=='> + <rect x='38.17' y='22.78' width='676.35' height='522.33' /> </clipPath> </defs> -<g clip-path='url(#cpNDMuMDZ8NzE0LjUyfDIyLjc4fDU0NS4xMQ==)'> -<rect x='43.06' y='22.78' width='671.46' height='522.33' style='stroke-width: 1.07; stroke: none; fill: #FFFFFF;' /> -<polyline points='43.06,422.85 714.52,422.85 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='43.06,261.03 714.52,261.03 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='43.06,99.21 714.52,99.21 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='185.54,545.11 185.54,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='466.21,545.11 466.21,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='43.06,503.76 714.52,503.76 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='43.06,341.94 714.52,341.94 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='43.06,180.12 714.52,180.12 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='45.98,545.11 45.98,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='325.11,545.11 325.11,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='607.31,545.11 607.31,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<line x1='43.06' y1='180.12' x2='714.52' y2='180.12' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.50; stroke-linecap: butt;' /> -<polyline points='73.58,113.42 76.65,113.53 79.72,114.93 82.79,117.89 85.85,122.37 88.92,127.81 91.99,133.02 95.06,137.31 98.12,140.65 101.19,143.05 104.26,144.47 107.33,144.89 110.39,144.29 113.46,142.68 116.53,140.13 119.60,137.11 122.66,134.11 125.73,131.24 128.80,128.51 131.86,126.27 134.93,125.67 138.00,127.59 141.07,132.14 144.13,139.27 147.20,147.82 150.27,155.39 153.34,160.69 156.40,163.63 159.47,164.31 162.54,163.70 165.61,163.18 168.67,163.27 171.74,163.97 174.81,165.30 177.88,167.45 180.94,170.59 184.01,174.75 187.08,179.94 190.15,185.65 193.21,190.28 196.28,192.64 199.35,192.59 202.42,190.16 205.48,186.75 208.55,185.13 211.62,186.79 214.69,191.81 217.75,200.05 220.82,209.95 223.89,219.36 226.95,227.48 230.02,234.31 233.09,239.87 236.16,244.27 239.22,247.63 242.29,249.95 245.36,251.26 248.43,251.81 251.49,252.41 254.56,253.69 257.63,255.71 260.70,258.47 263.76,262.04 266.83,266.56 269.90,272.11 272.97,278.68 276.03,286.27 279.10,294.67 282.17,303.62 285.24,313.04 288.30,322.91 291.37,332.94 294.44,341.65 297.51,347.49 300.57,350.16 303.64,349.66 306.71,346.76 309.78,343.76 312.84,342.40 315.91,342.85 318.98,345.09 322.04,348.61 325.11,352.40 328.18,355.95 331.25,359.22 334.31,362.18 337.38,364.45 340.45,365.50 343.52,365.17 346.58,363.44 349.65,360.39 352.72,356.36 355.79,351.71 358.85,346.50 361.92,340.75 364.99,334.95 368.06,330.63 371.12,328.88 374.19,329.84 377.26,333.48 380.33,339.48 383.39,347.21 386.46,356.34 389.53,366.85 392.60,378.66 395.66,390.78 398.73,401.90 401.80,411.56 404.86,419.77 407.93,426.49 411.00,431.66 414.07,435.17 417.13,437.02 420.20,437.21 423.27,435.77 426.34,432.86 429.40,428.56 432.47,422.89 435.54,415.85 438.61,407.79 441.67,399.33 444.74,390.79 447.81,382.18 450.88,373.57 453.94,365.65 457.01,359.32 460.08,354.88 463.15,352.35 466.21,351.59 469.28,352.07 472.35,353.24 475.42,354.99 478.48,357.33 481.55,360.05 484.62,362.57 487.69,364.48 490.75,365.73 493.82,366.34 496.89,366.73 499.95,367.62 503.02,369.40 506.09,372.09 509.16,375.65 512.22,379.90 515.29,384.58 518.36,389.59 521.43,394.95 524.49,400.46 527.56,405.26 530.63,408.54 533.70,410.11 536.76,410.01 539.83,408.67 542.90,407.39 545.97,407.09 549.03,407.84 552.10,409.62 555.17,411.94 558.24,413.89 561.30,415.02 564.37,415.31 567.44,414.87 570.51,414.69 573.57,416.04 576.64,419.34 579.71,424.59 582.78,431.36 585.84,437.62 588.91,441.43 591.98,442.43 595.04,440.63 598.11,436.63 601.18,432.04 604.25,428.02 607.31,424.66 610.38,421.94 613.45,419.53 616.52,416.79 619.58,413.41 622.65,409.38 625.72,404.76 628.79,399.98 631.85,395.58 634.92,391.75 637.99,388.48 641.06,385.72 644.12,383.21 647.19,380.71 650.26,378.17 653.33,375.59 656.39,372.94 659.46,370.13 662.53,367.10 665.60,363.85 668.66,360.40 671.73,357.24 674.80,355.24 677.86,354.84 680.93,356.04 684.00,358.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,127.41 76.65,126.67 79.72,126.32 82.79,126.63 85.85,127.60 88.92,129.17 91.99,131.22 95.06,133.70 98.12,136.60 101.19,139.89 104.26,143.20 107.33,146.01 110.39,148.13 113.46,149.54 116.53,150.25 119.60,150.17 122.66,149.21 125.73,147.35 128.80,144.61 131.86,140.95 134.93,136.32 138.00,130.68 141.07,124.02 144.13,116.38 147.20,109.03 150.27,104.54 153.34,104.32 156.40,108.44 159.47,116.74 162.54,127.49 165.61,138.20 168.67,147.96 171.74,156.77 174.81,164.54 177.88,170.88 180.94,175.37 184.01,177.92 187.08,178.53 190.15,177.94 193.21,178.44 196.28,181.79 199.35,188.19 202.42,197.56 205.48,208.03 208.55,215.82 211.62,218.88 214.69,217.10 217.75,210.82 220.82,203.46 223.89,199.85 226.95,201.73 230.02,209.12 233.09,221.41 236.16,235.45 239.22,247.98 242.29,258.31 245.36,266.43 248.43,272.47 251.49,276.75 254.56,279.53 257.63,280.83 260.70,280.70 263.76,279.77 266.83,279.34 269.90,280.11 272.97,282.11 276.03,285.30 279.10,289.28 282.17,293.49 285.24,297.75 288.30,302.06 291.37,306.32 294.44,310.17 297.51,313.22 300.57,315.37 303.64,316.64 306.71,317.54 309.78,319.65 312.84,324.11 315.91,331.07 318.98,340.46 322.04,351.17 325.11,360.99 328.18,368.75 331.25,374.40 334.31,377.99 337.38,379.99 340.45,381.06 343.52,381.43 346.58,381.09 349.65,380.03 352.72,378.23 355.79,375.62 358.85,372.21 361.92,368.01 364.99,363.66 368.06,361.09 371.12,361.71 374.19,365.67 377.26,372.91 380.33,381.87 383.39,389.58 386.46,394.47 389.53,396.48 392.60,395.75 395.66,393.65 398.73,392.02 401.80,391.51 404.86,392.12 407.93,393.70 411.00,395.58 414.07,397.09 417.13,398.09 420.20,398.58 423.27,398.49 426.34,397.62 429.40,395.81 432.47,393.06 435.54,389.37 438.61,385.31 441.67,381.88 444.74,379.63 447.81,378.56 450.88,378.60 453.94,378.96 457.01,378.57 460.08,377.09 463.15,374.51 466.21,371.03 469.28,367.64 472.35,365.30 475.42,364.20 478.48,364.33 481.55,365.59 484.62,367.61 487.69,370.15 490.75,373.20 493.82,376.73 496.89,380.36 499.95,383.41 503.02,385.51 506.09,386.66 509.16,386.89 512.22,386.59 515.29,386.27 518.36,386.10 521.43,386.07 524.49,386.32 527.56,387.43 530.63,389.99 533.70,394.11 536.76,399.78 539.83,406.33 542.90,411.90 545.97,415.18 549.03,416.04 552.10,414.52 555.17,411.46 558.24,408.40 561.30,406.11 564.37,404.62 567.44,403.89 570.51,403.55 573.57,403.13 576.64,402.48 579.71,401.60 582.78,400.64 585.84,400.29 588.91,401.23 591.98,403.59 595.04,407.35 598.11,412.02 601.18,416.19 604.25,418.91 607.31,420.08 610.38,419.73 613.45,418.34 616.52,416.81 619.58,415.58 622.65,414.66 625.72,414.00 628.79,413.25 631.85,411.94 634.92,409.93 637.99,407.22 641.06,403.94 644.12,400.71 647.19,398.12 650.26,396.28 653.33,395.19 656.39,394.78 659.46,394.89 662.53,395.40 665.60,396.30 668.66,397.60 671.73,399.41 674.80,401.91 677.86,405.19 680.93,409.26 684.00,413.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,127.81 76.65,128.05 79.72,128.93 82.79,130.54 85.85,132.88 88.92,135.63 91.99,138.13 95.06,140.02 98.12,141.28 101.19,142.00 104.26,143.08 107.33,145.87 110.39,150.86 113.46,158.05 116.53,166.96 119.60,174.86 122.66,178.89 125.73,178.41 128.80,173.43 131.86,164.62 134.93,154.12 138.00,143.59 141.07,133.22 144.13,123.03 147.20,113.46 150.27,105.41 153.34,99.40 156.40,95.44 159.47,93.61 162.54,94.60 165.61,99.44 168.67,108.48 171.74,121.73 174.81,138.63 177.88,156.13 180.94,171.05 184.01,182.71 187.08,191.11 190.15,196.62 193.21,200.38 196.28,203.30 199.35,205.47 202.42,206.90 205.48,208.12 208.55,210.17 211.62,213.60 214.69,218.45 217.75,224.66 220.82,231.58 223.89,238.33 226.95,244.58 230.02,250.34 233.09,255.48 236.16,259.43 239.22,261.57 242.29,261.77 245.36,260.05 248.43,257.15 251.49,255.35 254.56,256.36 257.63,260.38 260.70,267.38 263.76,276.60 266.83,286.59 269.90,296.55 272.97,306.45 276.03,316.21 279.10,325.13 282.17,332.23 285.24,337.14 288.30,339.87 291.37,340.58 294.44,340.13 297.51,339.37 300.57,338.49 303.64,337.48 306.71,336.34 309.78,335.03 312.84,333.54 315.91,331.86 318.98,329.99 322.04,327.83 325.11,325.19 328.18,321.98 331.25,318.19 334.31,313.97 337.38,310.78 340.45,310.64 343.52,314.25 346.58,321.61 349.65,332.21 352.72,343.49 355.79,352.83 358.85,359.73 361.92,364.19 364.99,366.88 368.06,369.77 371.12,374.31 374.19,380.67 377.26,388.80 380.33,397.90 383.39,406.39 386.46,413.46 389.53,419.08 392.60,423.23 395.66,425.61 398.73,425.87 401.80,423.86 404.86,419.60 407.93,413.46 411.00,407.32 414.07,403.03 417.13,400.96 420.20,401.12 423.27,403.04 426.34,405.45 429.40,407.39 432.47,408.77 435.54,409.57 438.61,409.19 441.67,406.52 444.74,400.97 447.81,392.53 450.88,381.39 453.94,369.42 457.01,359.10 460.08,351.28 463.15,345.96 466.21,342.96 469.28,341.45 472.35,340.61 475.42,340.26 478.48,340.42 481.55,341.12 484.62,342.47 487.69,344.52 490.75,347.31 493.82,350.81 496.89,354.91 499.95,359.41 503.02,364.20 506.09,369.27 509.16,374.58 512.22,379.70 515.29,384.04 518.36,387.41 521.43,389.82 524.49,391.37 527.56,392.56 530.63,393.87 533.70,395.41 536.76,397.16 539.83,399.16 542.90,401.46 545.97,404.11 549.03,407.11 552.10,410.44 555.17,413.89 558.24,417.03 561.30,419.64 564.37,421.71 567.44,423.28 570.51,424.51 573.57,425.65 576.64,426.77 579.71,427.87 582.78,428.93 585.84,429.86 588.91,430.57 591.98,431.03 595.04,431.26 598.11,431.01 601.18,429.65 604.25,426.75 607.31,422.25 610.38,416.23 613.45,409.69 616.52,404.52 619.58,401.63 622.65,401.05 625.72,402.61 628.79,404.88 631.85,405.97 634.92,405.32 637.99,402.90 641.06,398.89 644.12,394.05 647.19,389.09 650.26,384.14 653.33,379.21 656.39,374.48 659.46,370.43 662.53,367.40 665.60,365.42 668.66,364.47 671.73,364.25 674.80,364.18 677.86,364.00 680.93,363.69 684.00,363.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,140.22 76.65,143.18 79.72,146.53 82.79,149.66 85.85,152.56 88.92,154.88 91.99,155.87 95.06,155.14 98.12,152.66 101.19,148.54 104.26,143.87 107.33,140.29 110.39,138.38 113.46,138.16 116.53,139.47 119.60,141.46 122.66,143.22 125.73,144.55 128.80,145.46 131.86,145.91 134.93,145.82 138.00,145.12 141.07,143.81 144.13,141.90 147.20,139.58 150.27,137.28 153.34,135.22 156.40,133.42 159.47,131.91 162.54,131.02 165.61,131.20 168.67,132.65 171.74,135.34 174.81,139.24 177.88,144.04 180.94,149.44 184.01,155.36 187.08,161.82 190.15,168.63 193.21,175.28 196.28,181.36 199.35,186.83 202.42,191.72 205.48,196.46 208.55,202.00 211.62,208.82 214.69,216.94 217.75,226.23 220.82,235.14 223.89,241.49 226.95,244.49 230.02,244.14 233.09,240.92 236.16,237.36 239.22,236.08 242.29,237.63 245.36,242.00 248.43,248.63 251.49,255.74 254.56,262.01 257.63,267.29 260.70,271.60 263.76,275.47 266.83,279.95 269.90,285.60 272.97,292.45 276.03,300.42 279.10,308.71 282.17,316.23 285.24,322.58 288.30,327.75 291.37,331.82 294.44,335.19 297.51,338.24 300.57,341.06 303.64,343.64 306.71,345.86 309.78,347.28 312.84,347.58 315.91,346.75 318.98,344.80 322.04,342.60 325.11,341.80 328.18,343.29 331.25,347.11 334.31,353.07 337.38,359.26 340.45,363.08 343.52,363.63 346.58,360.89 349.65,355.29 352.72,348.97 355.79,344.06 358.85,341.00 361.92,339.80 364.99,340.34 368.06,342.35 371.12,345.61 374.19,350.10 377.26,355.79 380.33,362.19 383.39,368.32 386.46,373.66 389.53,378.20 392.60,381.99 395.66,385.47 398.73,389.24 401.80,393.50 404.86,398.25 407.93,403.34 411.00,407.91 414.07,411.14 417.13,412.86 420.20,413.07 423.27,411.86 426.34,409.44 429.40,406.00 432.47,401.54 435.54,396.10 438.61,390.33 441.67,385.47 444.74,382.15 447.81,380.40 450.88,380.19 453.94,381.19 457.01,382.98 460.08,385.42 463.15,388.50 466.21,392.00 469.28,394.83 472.35,395.92 475.42,395.06 478.48,392.27 481.55,387.94 484.62,383.22 487.69,378.95 490.75,375.21 493.82,372.00 496.89,369.49 499.95,368.03 503.02,367.77 506.09,368.72 509.16,370.84 512.22,373.65 515.29,376.54 518.36,379.31 521.43,381.97 524.49,384.50 527.56,386.89 530.63,389.15 533.70,391.25 536.76,393.21 539.83,395.08 542.90,397.01 545.97,399.09 549.03,401.34 552.10,403.75 555.17,406.17 558.24,408.32 561.30,410.07 564.37,411.41 567.44,412.38 570.51,413.27 573.57,414.47 576.64,416.13 579.71,418.22 582.78,420.57 585.84,422.28 588.91,422.50 591.98,421.08 595.04,418.02 598.11,413.92 601.18,410.42 604.25,408.68 607.31,408.80 610.38,410.76 613.45,413.90 616.52,417.09 619.58,419.76 622.65,421.88 625.72,423.43 628.79,424.11 631.85,423.55 634.92,421.64 637.99,418.37 641.06,413.99 644.12,409.65 647.19,406.42 650.26,404.50 653.33,403.88 656.39,404.15 659.46,404.18 662.53,403.19 665.60,401.12 668.66,397.99 671.73,394.27 674.80,390.76 677.86,387.87 680.93,385.63 684.00,384.17 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,137.66 76.65,139.03 79.72,138.70 82.79,135.95 85.85,130.83 88.92,124.96 91.99,121.71 95.06,122.93 98.12,128.74 101.19,138.85 104.26,150.21 107.33,158.41 110.39,161.81 113.46,160.38 116.53,154.64 119.60,147.50 122.66,141.98 125.73,138.78 128.80,137.87 131.86,138.73 134.93,139.61 138.00,139.19 141.07,137.30 144.13,133.98 147.20,130.05 150.27,127.23 153.34,126.45 156.40,127.75 159.47,131.07 162.54,135.65 165.61,140.40 168.67,144.94 171.74,149.26 174.81,153.35 177.88,157.13 180.94,160.53 184.01,163.54 187.08,166.15 190.15,168.44 193.21,170.69 196.28,173.07 199.35,175.62 202.42,178.35 205.48,181.61 208.55,186.12 211.62,192.28 214.69,200.09 217.75,209.49 220.82,219.66 223.89,229.50 226.95,238.59 230.02,246.92 233.09,254.40 236.16,260.43 239.22,264.43 242.29,266.26 245.36,265.94 248.43,264.06 251.49,262.50 254.56,262.67 257.63,264.72 260.70,268.63 263.76,273.78 266.83,278.97 269.90,283.52 272.97,287.43 276.03,290.72 279.10,293.83 282.17,297.35 285.24,301.49 288.30,306.25 291.37,311.59 294.44,317.28 297.51,323.07 300.57,328.94 303.64,334.86 306.71,340.47 309.78,344.62 312.84,346.47 315.91,345.92 318.98,343.03 322.04,338.79 325.11,335.18 328.18,333.24 331.25,333.02 334.31,334.51 337.38,337.66 340.45,342.41 343.52,348.72 346.58,356.59 349.65,365.76 352.72,374.81 355.79,382.34 358.85,388.05 361.92,391.95 364.99,394.22 368.06,395.36 371.12,395.77 374.19,395.47 377.26,394.45 380.33,392.53 383.39,389.30 386.46,384.57 389.53,378.32 392.60,370.78 395.66,363.96 398.73,360.63 401.80,361.72 404.86,367.24 407.93,376.51 411.00,386.21 414.07,393.02 417.13,396.30 420.20,396.04 423.27,393.14 426.34,390.11 429.40,388.81 432.47,389.43 435.54,391.93 438.61,395.57 441.67,398.95 444.74,401.35 447.81,402.73 450.88,403.13 453.94,402.74 457.01,401.84 460.08,400.51 463.15,398.76 466.21,396.56 469.28,393.80 472.35,390.35 475.42,386.20 478.48,381.34 481.55,375.93 484.62,370.41 487.69,365.09 490.75,360.01 493.82,355.19 496.89,351.27 499.95,349.47 503.02,350.39 506.09,354.05 509.16,360.27 512.22,367.42 515.29,373.34 518.36,377.32 521.43,379.36 524.49,379.81 527.56,380.42 530.63,382.87 533.70,387.47 536.76,394.23 539.83,402.52 542.90,410.66 545.97,417.45 549.03,422.78 552.10,426.64 555.17,428.83 558.24,429.02 561.30,427.03 564.37,422.86 567.44,416.69 570.51,410.11 573.57,405.20 576.64,402.63 579.71,402.41 582.78,404.21 585.84,406.48 588.91,407.76 591.98,407.76 595.04,406.50 598.11,404.38 601.18,402.50 604.25,401.63 607.31,401.86 610.38,403.14 613.45,404.93 616.52,406.20 619.58,406.45 622.65,405.67 625.72,403.98 628.79,402.36 631.85,402.10 634.92,403.60 637.99,406.86 641.06,411.59 644.12,416.46 647.19,420.23 650.26,422.66 653.33,423.75 656.39,423.76 659.46,423.33 662.53,422.90 665.60,422.52 668.66,422.19 671.73,422.08 674.80,422.44 677.86,423.41 680.93,425.00 684.00,426.76 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,87.11 76.65,92.11 79.72,97.44 82.79,102.02 85.85,105.85 88.92,109.12 91.99,112.22 95.06,115.38 98.12,118.61 101.19,121.88 104.26,125.02 107.33,127.74 110.39,129.95 113.46,131.63 116.53,132.78 119.60,133.27 122.66,132.97 125.73,131.84 128.80,129.90 131.86,127.42 134.93,125.25 138.00,124.08 141.07,123.98 144.13,124.95 147.20,126.85 150.27,129.41 153.34,132.47 156.40,136.02 159.47,140.09 162.54,144.97 165.61,151.05 168.67,158.49 171.74,167.28 174.81,177.21 177.88,187.01 180.94,195.37 184.01,202.03 187.08,206.98 190.15,210.32 193.21,212.37 196.28,213.40 199.35,213.43 202.42,212.47 205.48,210.88 208.55,209.37 211.62,208.34 214.69,207.81 217.75,207.78 220.82,208.32 223.89,209.56 226.95,211.52 230.02,214.21 233.09,217.51 236.16,220.80 239.22,223.46 242.29,225.34 245.36,226.46 248.43,227.33 251.49,229.55 254.56,234.31 257.63,241.76 260.70,251.85 263.76,263.75 266.83,275.75 269.90,286.97 272.97,297.37 276.03,306.95 279.10,315.89 282.17,324.43 285.24,332.67 288.30,340.58 291.37,348.03 294.44,354.17 297.51,358.16 300.57,359.83 303.64,359.19 306.71,356.72 309.78,353.94 312.84,351.97 315.91,350.91 318.98,350.76 322.04,350.91 325.11,350.25 328.18,348.16 331.25,344.62 334.31,339.74 337.38,334.66 340.45,330.93 343.52,329.10 346.58,329.15 349.65,330.97 352.72,333.83 355.79,337.01 358.85,340.37 361.92,343.91 364.99,347.47 368.06,350.59 371.12,352.93 374.19,354.45 377.26,355.19 380.33,355.92 383.39,358.12 386.46,362.57 389.53,369.30 392.60,378.17 395.66,387.87 398.73,396.59 401.80,403.74 404.86,409.30 407.93,413.38 411.00,416.46 414.07,419.03 417.13,421.17 420.20,422.89 423.27,424.32 426.34,425.79 429.40,427.58 432.47,429.69 435.54,432.09 438.61,433.75 441.67,432.72 444.74,427.99 447.81,419.52 450.88,407.53 453.94,393.89 457.01,381.13 460.08,370.10 463.15,360.81 466.21,353.23 469.28,347.29 472.35,342.90 475.42,340.05 478.48,338.73 481.55,338.96 484.62,340.75 487.69,344.13 490.75,349.10 493.82,355.61 496.89,362.84 499.95,369.24 503.02,374.01 506.09,377.13 509.16,378.68 512.22,379.51 515.29,380.73 518.36,382.68 521.43,385.38 524.49,388.74 527.56,392.35 530.63,395.81 533.70,399.06 536.76,402.08 539.83,404.71 542.90,406.49 545.97,407.07 549.03,406.44 552.10,404.63 555.17,402.50 558.24,401.60 561.30,402.74 564.37,405.93 567.44,410.99 570.51,416.35 573.57,419.94 576.64,421.11 579.71,419.84 582.78,416.45 585.84,412.31 588.91,408.77 591.98,406.07 595.04,404.21 598.11,403.11 601.18,402.54 604.25,402.36 607.31,402.53 610.38,403.05 613.45,403.75 616.52,404.32 619.58,404.58 622.65,404.55 625.72,404.29 628.79,404.46 631.85,405.91 634.92,408.91 637.99,413.45 641.06,419.26 644.12,425.10 647.19,429.80 650.26,433.13 653.33,435.11 656.39,436.02 659.46,436.62 662.53,437.43 665.60,438.51 668.66,439.85 671.73,441.17 674.80,442.00 677.86,442.10 680.93,441.47 684.00,440.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,220.83 76.65,206.84 79.72,192.71 82.79,181.67 85.85,173.69 88.92,167.73 91.99,161.63 95.06,154.20 98.12,145.37 101.19,135.25 104.26,125.14 107.33,116.86 110.39,111.12 113.46,107.92 116.53,107.11 119.60,107.78 122.66,108.99 125.73,110.54 128.80,112.43 131.86,114.42 134.93,115.78 138.00,115.95 141.07,114.87 144.13,112.57 147.20,110.17 150.27,109.97 153.34,113.23 156.40,120.02 159.47,130.16 162.54,141.84 165.61,152.51 168.67,161.21 171.74,167.93 174.81,172.74 177.88,176.06 180.94,178.31 184.01,179.58 187.08,179.87 190.15,179.70 193.21,180.69 196.28,184.09 199.35,190.01 202.42,198.44 205.48,208.27 208.55,217.32 211.62,224.39 214.69,229.43 217.75,232.48 220.82,234.06 223.89,234.87 226.95,235.19 230.02,235.00 233.09,234.45 236.16,234.24 239.22,235.12 242.29,237.22 245.36,240.56 248.43,244.97 251.49,249.97 254.56,255.20 257.63,260.62 260.70,266.23 263.76,272.32 266.83,279.42 269.90,287.84 272.97,297.57 276.03,308.51 279.10,319.45 282.17,328.72 285.24,335.73 288.30,340.48 291.37,343.01 294.44,343.59 297.51,342.48 300.57,339.73 303.64,335.35 306.71,329.62 309.78,323.45 312.84,317.49 315.91,311.81 318.98,306.44 322.04,302.38 325.11,301.53 328.18,304.90 331.25,312.54 334.31,324.20 337.38,337.60 340.45,349.56 343.52,359.01 346.58,365.93 349.65,370.36 352.72,372.52 355.79,372.62 358.85,370.72 361.92,366.82 364.99,361.56 368.06,356.80 371.12,353.92 374.19,353.08 377.26,354.25 380.33,357.24 383.39,361.65 386.46,367.28 389.53,374.13 392.60,382.14 395.66,390.87 398.73,399.69 401.80,408.41 404.86,417.01 407.93,425.34 411.00,432.61 414.07,438.02 417.13,441.41 420.20,442.78 423.27,442.20 426.34,439.82 429.40,435.76 432.47,430.05 435.54,422.68 438.61,413.99 441.67,404.56 444.74,394.71 447.81,384.45 450.88,373.88 453.94,363.91 457.01,355.78 460.08,349.89 463.15,346.26 466.21,344.71 469.28,344.44 472.35,344.67 475.42,345.26 478.48,346.19 481.55,347.48 484.62,349.16 487.69,351.27 490.75,353.78 493.82,356.71 496.89,359.66 499.95,361.97 503.02,363.29 506.09,363.60 509.16,363.02 512.22,362.54 515.29,363.48 518.36,366.27 521.43,370.92 524.49,377.26 527.56,384.56 530.63,392.08 533.70,399.71 536.76,407.42 539.83,415.00 542.90,421.78 545.97,427.32 549.03,431.57 552.10,434.53 555.17,436.26 558.24,436.88 561.30,436.45 564.37,434.97 567.44,432.50 570.51,429.52 573.57,426.71 576.64,424.25 579.71,422.16 582.78,420.35 585.84,418.40 588.91,415.92 591.98,412.84 595.04,409.16 598.11,405.20 601.18,401.84 604.25,399.70 607.31,398.83 610.38,399.21 613.45,400.57 616.52,402.40 619.58,404.44 622.65,406.69 625.72,409.11 628.79,411.31 631.85,412.82 634.92,413.48 637.99,413.29 641.06,412.30 644.12,410.72 647.19,408.74 650.26,406.39 653.33,403.67 656.39,400.80 659.46,398.29 662.53,396.52 665.60,395.52 668.66,395.29 671.73,395.75 674.80,396.78 677.86,398.30 680.93,400.31 684.00,402.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,127.66 76.65,127.46 79.72,128.57 82.79,131.30 85.85,135.65 88.92,140.70 91.99,144.59 95.06,146.29 98.12,145.74 101.19,143.04 104.26,139.30 107.33,136.09 110.39,134.03 113.46,133.12 116.53,133.20 119.60,133.45 122.66,133.00 125.73,131.65 128.80,129.40 131.86,126.78 134.93,125.44 138.00,126.65 141.07,130.55 144.13,137.12 147.20,145.40 150.27,153.45 153.34,160.19 156.40,165.57 159.47,169.59 162.54,172.10 165.61,172.91 168.67,171.95 171.74,169.23 174.81,165.04 177.88,161.09 180.94,159.13 184.01,159.53 187.08,162.30 190.15,167.00 193.21,172.31 196.28,177.21 199.35,181.58 202.42,185.43 205.48,188.96 208.55,192.55 211.62,196.43 214.69,200.60 217.75,205.07 220.82,209.99 223.89,215.56 226.95,221.84 230.02,228.84 233.09,236.34 236.16,243.12 239.22,247.95 242.29,250.57 245.36,250.98 248.43,249.88 251.49,249.38 254.56,251.06 257.63,255.12 260.70,261.51 263.76,269.62 266.83,278.22 269.90,286.63 272.97,294.84 276.03,302.85 279.10,310.77 282.17,318.75 285.24,326.85 288.30,335.07 291.37,343.08 294.44,349.26 297.51,351.91 300.57,350.71 303.64,345.64 306.71,337.85 309.78,330.67 312.84,326.62 315.91,325.96 318.98,328.66 322.04,333.53 325.11,338.31 328.18,341.80 331.25,343.95 334.31,344.82 337.38,345.16 340.45,345.98 343.52,347.62 346.58,350.08 349.65,353.19 352.72,356.04 355.79,357.72 358.85,358.05 361.92,357.03 364.99,355.16 368.06,353.89 371.12,354.30 374.19,356.50 377.26,360.46 380.33,365.71 383.39,371.32 386.46,376.80 389.53,382.13 392.60,387.31 395.66,392.17 398.73,396.54 401.80,400.33 404.86,403.55 407.93,406.25 411.00,408.77 414.07,411.42 417.13,414.26 420.20,417.28 423.27,420.05 426.34,421.26 429.40,419.98 432.47,416.12 435.54,409.71 438.61,401.53 441.67,393.05 444.74,385.05 447.81,377.54 450.88,370.58 453.94,364.77 457.01,360.87 460.08,359.16 463.15,359.62 466.21,362.09 469.28,365.76 472.35,369.83 475.42,374.15 478.48,378.72 481.55,383.17 484.62,386.55 487.69,388.13 490.75,387.84 493.82,385.73 496.89,382.44 499.95,379.21 503.02,376.65 506.09,374.80 509.16,373.67 512.22,373.48 515.29,374.51 518.36,376.86 521.43,380.51 524.49,385.30 527.56,390.36 530.63,394.86 533.70,398.64 536.76,401.72 539.83,404.18 542.90,406.33 545.97,408.39 549.03,410.37 552.10,412.25 555.17,413.72 558.24,414.20 561.30,413.39 564.37,411.28 567.44,407.99 570.51,404.52 573.57,402.21 576.64,401.48 579.71,402.32 582.78,404.50 585.84,406.85 588.91,408.25 591.98,408.50 595.04,407.60 598.11,405.75 601.18,403.48 604.25,401.16 607.31,398.83 610.38,396.50 613.45,394.39 616.52,392.94 619.58,392.33 622.65,392.59 625.72,393.68 628.79,395.44 631.85,397.65 634.92,400.24 637.99,403.20 641.06,406.53 644.12,410.16 647.19,414.06 650.26,418.22 653.33,422.62 656.39,427.05 659.46,430.90 662.53,433.75 665.60,435.56 668.66,436.36 671.73,436.42 674.80,436.27 677.86,436.16 680.93,436.11 684.00,436.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,169.73 76.65,169.50 79.72,168.71 82.79,167.29 85.85,165.25 88.92,162.52 91.99,158.93 95.06,154.42 98.12,148.97 101.19,142.64 104.26,136.07 107.33,130.16 110.39,125.25 113.46,121.35 116.53,118.44 119.60,116.39 122.66,115.05 125.73,114.41 128.80,114.46 131.86,115.19 134.93,116.59 138.00,118.63 141.07,121.32 144.13,124.65 147.20,128.50 150.27,132.63 153.34,136.89 156.40,141.28 159.47,145.75 162.54,149.78 165.61,152.59 168.67,153.92 171.74,153.76 174.81,152.44 177.88,151.72 180.94,153.47 184.01,158.08 187.08,165.54 190.15,175.16 193.21,184.72 196.28,192.55 199.35,198.45 202.42,202.43 205.48,204.84 208.55,206.34 211.62,207.31 214.69,207.75 217.75,207.74 220.82,208.09 223.89,209.93 226.95,213.66 230.02,219.28 233.09,226.61 236.16,234.57 239.22,242.08 242.29,248.91 245.36,255.07 248.43,260.61 251.49,265.75 254.56,270.65 257.63,275.32 260.70,279.78 263.76,284.42 266.83,290.01 269.90,296.96 272.97,305.30 276.03,314.92 279.10,324.67 282.17,332.99 285.24,339.31 288.30,343.63 291.37,345.99 294.44,346.54 297.51,345.48 300.57,342.82 303.64,338.59 306.71,333.48 309.78,329.62 312.84,328.60 315.91,330.58 318.98,335.50 322.04,341.83 325.11,346.57 328.18,348.12 331.25,346.42 334.31,341.70 337.38,336.19 340.45,332.96 343.52,333.09 346.58,336.57 349.65,342.93 352.72,349.73 355.79,354.50 358.85,356.75 361.92,356.48 364.99,354.39 368.06,352.47 371.12,352.22 374.19,353.78 377.26,357.13 380.33,361.92 383.39,367.45 386.46,373.34 389.53,379.58 392.60,386.11 395.66,392.29 398.73,397.26 401.80,400.74 404.86,402.72 407.93,403.35 411.00,403.39 414.07,403.60 417.13,404.13 420.20,404.98 423.27,405.97 426.34,406.58 429.40,406.44 432.47,405.51 435.54,403.81 438.61,401.64 441.67,399.57 444.74,397.90 447.81,396.65 450.88,395.69 453.94,394.08 457.01,390.49 460.08,384.50 463.15,376.11 466.21,365.79 469.28,355.85 472.35,348.57 475.42,344.39 478.48,343.31 481.55,344.97 484.62,348.41 487.69,352.91 490.75,358.42 493.82,364.90 496.89,371.55 499.95,376.91 503.02,380.23 506.09,381.48 509.16,380.77 512.22,379.17 515.29,378.06 518.36,377.91 521.43,378.71 524.49,380.41 527.56,382.79 530.63,385.61 533.70,388.84 536.76,392.48 539.83,396.27 542.90,399.55 545.97,401.84 549.03,403.09 552.10,403.32 555.17,403.14 558.24,403.61 561.30,405.29 564.37,408.20 567.44,412.24 570.51,416.70 573.57,420.65 576.64,423.77 579.71,426.06 582.78,427.59 585.84,428.64 588.91,429.49 591.98,430.18 595.04,430.72 598.11,431.03 601.18,430.93 604.25,430.30 607.31,429.12 610.38,427.40 613.45,425.23 616.52,422.82 619.58,420.24 622.65,417.50 625.72,414.63 628.79,411.95 631.85,409.85 634.92,408.47 637.99,407.79 641.06,407.85 644.12,408.72 647.19,410.48 650.26,413.14 653.33,416.71 656.39,420.92 659.46,425.05 662.53,428.63 665.60,431.59 668.66,433.96 671.73,435.75 674.80,437.01 677.86,437.78 680.93,438.06 684.00,437.96 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,46.53 76.65,53.40 79.72,60.38 82.79,65.87 85.85,69.89 88.92,72.95 91.99,76.10 95.06,79.92 98.12,84.45 101.19,89.73 104.26,96.17 107.33,104.37 110.39,114.58 113.46,126.78 116.53,140.66 119.60,154.45 122.66,166.25 125.73,175.67 128.80,182.70 131.86,187.18 134.93,188.61 138.00,186.62 141.07,181.15 144.13,172.25 147.20,161.28 150.27,150.98 153.34,142.85 156.40,136.98 159.47,133.34 162.54,131.62 165.61,131.41 168.67,132.55 171.74,135.03 174.81,138.81 177.88,143.68 180.94,149.39 184.01,155.91 187.08,163.22 190.15,171.05 193.21,178.52 196.28,184.96 199.35,190.29 202.42,194.53 205.48,197.99 208.55,201.29 211.62,204.78 214.69,208.47 217.75,212.41 220.82,217.01 223.89,222.89 226.95,230.24 230.02,239.08 233.09,249.08 236.16,258.52 239.22,265.61 242.29,269.99 245.36,271.65 248.43,271.02 251.49,269.34 254.56,267.60 257.63,265.87 260.70,264.20 263.76,263.19 266.83,264.04 269.90,267.39 272.97,273.28 276.03,281.60 279.10,291.24 282.17,300.67 285.24,309.34 288.30,317.25 291.37,324.29 294.44,329.96 297.51,333.72 300.57,335.46 303.64,335.20 306.71,333.55 309.78,332.39 312.84,333.11 315.91,335.86 318.98,340.61 322.04,346.34 325.11,351.07 328.18,353.77 331.25,354.39 334.31,353.04 337.38,350.72 340.45,348.83 343.52,347.86 346.58,347.81 349.65,348.68 352.72,350.44 355.79,353.08 358.85,356.59 361.92,360.97 364.99,365.84 368.06,370.10 371.12,372.94 374.19,374.28 377.26,374.14 380.33,373.40 383.39,373.73 386.46,376.00 389.53,380.24 392.60,386.33 395.66,392.91 398.73,398.20 401.80,401.56 404.86,403.00 407.93,402.64 411.00,401.13 414.07,399.11 417.13,396.72 420.20,393.96 423.27,391.17 426.34,389.37 429.40,389.30 432.47,391.03 435.54,394.52 438.61,398.62 441.67,401.19 444.74,401.10 447.81,398.33 450.88,393.05 453.94,387.09 457.01,382.85 460.08,381.14 463.15,381.97 466.21,384.89 469.28,387.76 472.35,388.46 475.42,386.59 478.48,382.14 481.55,375.71 484.62,368.96 487.69,363.10 490.75,358.23 493.82,354.38 496.89,351.92 499.95,351.55 503.02,353.63 506.09,358.17 509.16,365.03 512.22,372.92 515.29,380.14 518.36,386.14 521.43,390.92 524.49,394.57 527.56,397.57 530.63,400.40 533.70,403.14 536.76,405.80 539.83,408.31 542.90,410.51 545.97,412.30 549.03,413.67 552.10,414.60 555.17,414.92 558.24,414.30 561.30,412.58 564.37,409.75 567.44,405.91 570.51,401.94 573.57,398.98 576.64,397.39 579.71,397.17 582.78,398.22 585.84,400.05 588.91,402.19 591.98,404.55 595.04,407.13 598.11,410.06 601.18,413.68 604.25,418.23 607.31,423.72 610.38,430.11 613.45,436.28 616.52,440.23 619.58,440.96 622.65,438.45 625.72,432.89 628.79,426.02 631.85,420.09 634.92,415.80 637.99,413.15 641.06,411.99 644.12,411.59 647.19,411.26 650.26,410.88 653.33,410.46 656.39,409.93 659.46,409.19 662.53,408.16 665.60,406.83 668.66,405.21 671.73,403.49 674.80,402.01 677.86,400.95 680.93,400.30 684.00,400.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,126.66 76.65,125.44 79.72,124.51 82.79,124.23 85.85,124.59 88.92,125.66 91.99,127.54 95.06,130.31 98.12,133.97 101.19,138.46 104.26,143.23 107.33,147.49 110.39,150.93 113.46,153.56 116.53,155.24 119.60,155.26 122.66,152.90 125.73,147.97 128.80,140.48 131.86,131.19 134.93,122.47 138.00,116.16 141.07,112.49 144.13,111.43 147.20,112.65 150.27,115.44 153.34,119.43 156.40,124.58 159.47,130.85 162.54,137.75 165.61,144.56 168.67,151.01 171.74,157.12 174.81,162.84 177.88,168.04 180.94,172.57 184.01,176.40 187.08,179.52 190.15,182.12 193.21,184.72 196.28,187.74 199.35,191.23 202.42,195.18 205.48,199.50 208.55,204.02 211.62,208.64 214.69,213.36 217.75,218.19 220.82,223.29 223.89,228.90 226.95,235.11 230.02,241.91 233.09,249.12 236.16,255.69 239.22,260.58 242.29,263.56 245.36,264.62 248.43,264.34 251.49,264.40 254.56,266.09 257.63,269.56 260.70,274.77 263.76,281.03 266.83,286.96 269.90,291.83 272.97,295.59 276.03,298.32 279.10,300.75 282.17,303.88 285.24,308.06 288.30,313.31 291.37,319.42 294.44,325.37 297.51,330.11 300.57,333.45 303.64,335.36 306.71,336.03 309.78,335.96 312.84,335.51 315.91,334.73 318.98,333.63 322.04,332.36 325.11,331.21 328.18,330.36 331.25,329.80 334.31,329.56 337.38,329.94 340.45,331.34 343.52,333.90 346.58,337.61 349.65,342.40 352.72,347.87 355.79,353.60 358.85,359.50 361.92,365.59 364.99,371.67 368.06,377.17 371.12,381.69 374.19,385.18 377.26,387.64 380.33,389.17 383.39,389.91 386.46,389.95 389.53,389.29 392.60,388.02 395.66,386.87 398.73,386.87 401.80,388.37 404.86,391.35 407.93,395.52 411.00,399.35 414.07,401.34 417.13,401.19 420.20,398.90 423.27,395.11 426.34,391.63 429.40,389.78 432.47,389.71 435.54,391.39 438.61,394.19 441.67,396.92 444.74,398.99 447.81,400.36 450.88,401.02 453.94,400.74 457.01,399.26 460.08,396.45 463.15,392.33 466.21,387.01 469.28,381.00 472.35,374.82 475.42,368.57 478.48,362.25 481.55,356.19 484.62,351.32 487.69,348.32 490.75,347.26 493.82,348.11 496.89,350.65 499.95,354.40 503.02,359.15 506.09,364.89 509.16,371.53 512.22,378.35 515.29,384.37 518.36,389.28 521.43,393.08 524.49,395.79 527.56,397.60 530.63,398.67 533.70,399.01 536.76,398.65 539.83,397.66 542.90,396.29 545.97,394.71 549.03,392.95 552.10,391.01 555.17,389.38 558.24,388.93 561.30,390.09 564.37,392.87 567.44,397.16 570.51,401.84 573.57,405.46 576.64,407.56 579.71,408.13 582.78,407.33 585.84,405.93 588.91,404.64 591.98,403.59 595.04,402.80 598.11,402.37 601.18,402.63 604.25,403.82 607.31,405.94 610.38,409.00 613.45,412.89 616.52,417.41 619.58,422.46 622.65,428.04 625.72,434.08 628.79,439.98 631.85,444.96 634.92,448.78 637.99,451.43 641.06,453.03 644.12,454.09 647.19,455.09 650.26,456.12 653.33,457.19 656.39,458.61 659.46,461.25 662.53,465.69 665.60,471.99 668.66,480.12 671.73,489.41 674.80,498.63 677.86,507.22 680.93,515.16 684.00,521.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,142.25 76.65,142.84 79.72,143.86 82.79,145.27 85.85,147.07 88.92,149.02 91.99,150.64 95.06,151.66 98.12,152.07 101.19,151.90 104.26,151.43 107.33,151.11 110.39,151.08 113.46,151.36 116.53,151.83 119.60,151.94 122.66,151.09 125.73,149.15 128.80,146.12 131.86,142.36 134.93,138.96 138.00,136.80 141.07,135.98 144.13,136.47 147.20,137.89 150.27,139.45 153.34,140.69 156.40,141.60 159.47,142.15 162.54,142.01 165.61,140.69 168.67,138.03 171.74,134.03 174.81,129.09 177.88,125.42 180.94,125.32 184.01,129.30 187.08,137.35 190.15,148.64 193.21,160.60 196.28,171.27 199.35,180.41 202.42,188.05 205.48,194.99 208.55,202.79 211.62,212.31 214.69,223.59 217.75,236.42 220.82,248.62 223.89,257.12 226.95,260.82 230.02,259.71 233.09,254.47 236.16,248.73 239.22,246.26 242.29,247.82 245.36,253.44 248.43,262.29 251.49,271.96 254.56,280.61 257.63,288.03 260.70,294.21 263.76,298.91 266.83,301.64 269.90,302.13 272.97,300.37 276.03,296.49 279.10,291.83 282.17,288.24 285.24,286.40 288.30,286.29 291.37,287.87 294.44,290.77 297.51,294.68 300.57,299.50 303.64,305.24 306.71,312.01 309.78,320.14 312.84,329.88 315.91,341.25 318.98,354.20 322.04,367.41 325.11,378.34 328.18,385.62 331.25,389.21 334.31,389.22 337.38,386.84 340.45,383.73 343.52,380.44 346.58,376.99 349.65,373.29 352.72,368.91 355.79,363.41 358.85,356.70 361.92,348.78 364.99,340.38 368.06,333.59 371.12,329.95 374.19,329.62 377.26,332.59 380.33,338.33 383.39,345.84 386.46,354.61 389.53,364.61 392.60,375.74 395.66,386.97 398.73,396.90 401.80,405.04 404.86,411.41 407.93,416.09 411.00,419.63 414.07,422.54 417.13,424.93 420.20,426.79 423.27,428.04 426.34,428.42 429.40,427.75 432.47,426.00 435.54,423.19 438.61,419.54 441.67,415.45 444.74,411.14 447.81,406.62 450.88,401.87 453.94,396.73 457.01,391.02 460.08,384.66 463.15,377.65 466.21,370.11 469.28,362.68 472.35,355.96 475.42,350.07 478.48,345.01 481.55,340.99 484.62,338.60 487.69,338.26 490.75,340.02 493.82,343.83 496.89,348.74 499.95,352.97 503.02,355.60 506.09,356.62 509.16,356.09 512.22,354.74 515.29,353.48 518.36,352.64 521.43,352.21 524.49,352.29 527.56,353.38 530.63,355.93 533.70,360.03 536.76,365.69 539.83,372.67 542.90,380.35 545.97,388.27 549.03,396.40 552.10,404.69 555.17,412.36 558.24,417.96 561.30,420.77 564.37,420.77 567.44,418.16 570.51,414.76 573.57,412.96 576.64,413.51 579.71,416.43 582.78,421.45 585.84,427.31 588.91,432.83 591.98,437.78 595.04,442.17 598.11,445.85 601.18,448.48 604.25,449.81 607.31,449.81 610.38,448.51 613.45,446.54 616.52,445.03 619.58,444.54 622.65,445.08 625.72,446.50 628.79,447.47 631.85,446.28 634.92,442.37 637.99,435.76 641.06,426.92 644.12,418.11 647.19,411.45 650.26,407.32 653.33,405.71 656.39,406.05 659.46,406.78 662.53,406.83 665.60,406.10 668.66,404.63 671.73,403.22 674.80,403.29 677.86,405.51 680.93,409.92 684.00,415.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,97.53 76.65,100.19 79.72,101.82 82.79,101.59 85.85,99.52 88.92,96.79 91.99,95.83 95.06,98.01 98.12,103.39 101.19,111.86 104.26,122.24 107.33,132.80 110.39,142.89 113.46,152.51 116.53,161.43 119.60,168.38 122.66,172.00 125.73,172.00 128.80,168.38 131.86,161.80 134.93,154.38 138.00,147.74 141.07,142.07 144.13,137.37 147.20,133.48 150.27,130.11 153.34,127.09 156.40,124.40 159.47,122.17 162.54,121.52 165.61,124.09 168.67,130.49 171.74,140.71 174.81,154.19 177.88,167.86 180.94,178.52 184.01,185.47 187.08,188.72 190.15,189.21 193.21,189.86 196.28,192.89 199.35,198.57 202.42,206.84 205.48,216.52 208.55,225.19 211.62,231.56 214.69,235.56 217.75,237.27 220.82,237.57 223.89,237.69 226.95,238.08 230.02,238.74 233.09,239.69 236.16,241.03 239.22,242.90 242.29,245.30 245.36,248.24 248.43,251.67 251.49,255.39 254.56,259.26 257.63,263.29 260.70,267.46 263.76,271.80 266.83,276.34 269.90,281.12 272.97,286.14 276.03,291.40 279.10,297.00 282.17,303.09 285.24,309.72 288.30,316.88 291.37,324.33 294.44,330.73 297.51,334.76 300.57,336.12 303.64,334.83 306.71,331.48 309.78,327.85 312.84,325.28 315.91,323.91 318.98,323.74 322.04,324.84 325.11,327.34 328.18,331.31 331.25,336.75 334.31,343.55 337.38,350.58 340.45,356.33 343.52,360.24 346.58,362.32 349.65,362.73 352.72,362.24 355.79,361.63 358.85,361.07 361.92,360.55 364.99,360.30 368.06,360.96 371.12,363.01 374.19,366.51 377.26,371.41 380.33,376.99 383.39,381.85 386.46,385.26 389.53,387.18 392.60,387.70 395.66,387.67 398.73,388.24 401.80,389.80 404.86,392.34 407.93,395.82 411.00,399.89 414.07,404.23 417.13,408.78 420.20,413.53 423.27,417.85 426.34,419.90 429.40,418.33 432.47,413.02 435.54,404.06 438.61,393.38 441.67,384.68 444.74,379.84 447.81,378.96 450.88,381.76 453.94,385.93 457.01,388.33 460.08,387.91 463.15,384.68 466.21,379.02 469.28,372.83 472.35,367.98 475.42,364.83 478.48,363.36 481.55,363.38 484.62,364.25 487.69,365.55 490.75,367.21 493.82,369.24 496.89,371.43 499.95,373.36 503.02,374.85 506.09,375.89 509.16,376.50 512.22,376.89 515.29,377.36 518.36,378.00 521.43,378.81 524.49,379.79 527.56,380.97 530.63,382.37 533.70,383.99 536.76,385.82 539.83,388.09 542.90,391.33 545.97,395.96 549.03,402.02 552.10,409.45 555.17,417.31 558.24,423.89 561.30,428.32 564.37,430.57 567.44,430.68 570.51,429.08 573.57,426.30 576.64,422.53 579.71,417.75 582.78,412.21 585.84,406.92 588.91,402.89 591.98,400.29 595.04,399.13 598.11,399.22 601.18,400.10 604.25,401.42 607.31,403.16 610.38,405.30 613.45,407.61 616.52,409.66 619.58,411.26 622.65,412.38 625.72,413.05 628.79,413.45 631.85,413.83 634.92,414.24 637.99,414.70 641.06,415.21 644.12,415.80 647.19,416.50 650.26,417.33 653.33,418.28 656.39,419.39 659.46,420.72 662.53,422.35 665.60,424.28 668.66,426.47 671.73,428.43 674.80,429.26 677.86,428.52 680.93,426.21 684.00,423.19 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,103.81 76.65,107.20 79.72,110.90 82.79,114.18 85.85,117.05 88.92,119.44 91.99,121.25 95.06,122.43 98.12,122.97 101.19,122.92 104.26,122.96 107.33,124.03 110.39,126.48 113.46,130.33 116.53,135.38 119.60,140.57 122.66,144.76 125.73,147.71 128.80,149.42 131.86,150.00 134.93,149.84 138.00,149.22 141.07,148.17 144.13,146.71 147.20,145.56 150.27,146.13 153.34,149.20 156.40,154.82 159.47,162.82 162.54,171.27 165.61,177.46 168.67,180.40 171.74,180.06 174.81,176.89 177.88,173.21 180.94,171.43 184.01,172.09 187.08,175.17 190.15,180.02 193.21,184.54 196.28,187.13 199.35,187.63 202.42,186.06 205.48,183.43 208.55,181.71 211.62,182.01 214.69,184.36 217.75,188.74 220.82,194.74 223.89,201.82 226.95,209.77 230.02,218.59 233.09,228.15 236.16,237.71 239.22,246.53 242.29,254.43 245.36,261.43 248.43,267.46 251.49,272.40 254.56,276.12 257.63,278.62 260.70,279.93 263.76,280.89 266.83,283.18 269.90,287.70 272.97,294.49 276.03,303.38 279.10,312.56 282.17,319.53 285.24,323.42 288.30,324.21 291.37,322.36 294.44,320.19 297.51,320.08 300.57,322.51 303.64,327.48 306.71,334.42 309.78,341.56 312.84,347.61 315.91,352.43 318.98,356.01 322.04,358.19 325.11,358.69 328.18,357.33 331.25,354.13 334.31,349.15 337.38,343.23 340.45,337.50 343.52,332.34 346.58,327.77 349.65,324.02 352.72,322.32 355.79,323.91 358.85,329.03 361.92,337.68 364.99,348.91 368.06,359.98 371.12,368.83 374.19,375.26 377.26,379.29 380.33,381.36 383.39,382.34 386.46,382.67 389.53,382.37 392.60,381.55 395.66,381.10 398.73,382.27 401.80,385.48 404.86,390.74 407.93,397.69 411.00,404.63 414.07,409.89 417.13,413.10 420.20,414.29 423.27,413.78 426.34,412.50 429.40,411.15 432.47,409.80 435.54,408.42 438.61,406.74 441.67,404.22 444.74,400.58 447.81,395.80 450.88,390.02 453.94,384.46 457.01,380.72 460.08,379.37 463.15,380.40 466.21,383.49 469.28,387.08 472.35,389.65 475.42,390.90 478.48,390.84 481.55,389.61 484.62,387.65 487.69,385.28 490.75,382.52 493.82,379.37 496.89,375.87 499.95,372.07 503.02,368.00 506.09,363.66 509.16,359.14 512.22,355.14 515.29,352.62 518.36,351.90 521.43,352.98 524.49,355.71 527.56,359.45 530.63,363.57 533.70,367.93 536.76,372.54 539.83,377.51 542.90,383.13 545.97,389.61 549.03,396.96 552.10,405.14 555.17,413.07 558.24,418.78 561.30,421.30 564.37,420.59 567.44,416.86 570.51,412.02 573.57,408.56 576.64,407.29 579.71,408.21 582.78,411.10 585.84,414.95 588.91,418.81 591.98,422.48 595.04,425.98 598.11,429.07 601.18,431.13 604.25,431.72 607.31,430.81 610.38,428.42 613.45,425.06 616.52,421.69 619.58,418.77 622.65,416.30 625.72,414.28 628.79,412.54 631.85,410.86 634.92,409.17 637.99,407.47 641.06,405.89 644.12,404.96 647.19,405.20 650.26,406.70 653.33,409.46 656.39,413.09 659.46,416.54 662.53,419.10 665.60,420.69 668.66,421.34 671.73,421.42 674.80,421.60 677.86,422.21 680.93,423.25 684.00,424.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,111.29 76.65,117.98 79.72,126.39 82.79,135.36 85.85,144.87 88.92,154.09 91.99,161.35 95.06,165.70 98.12,167.10 101.19,165.62 104.26,161.96 107.33,157.16 110.39,151.61 113.46,145.30 116.53,138.39 119.60,131.75 122.66,126.26 125.73,122.14 128.80,119.38 131.86,117.96 134.93,117.81 138.00,118.86 141.07,121.11 144.13,124.56 147.20,128.96 150.27,133.83 153.34,138.90 156.40,144.16 159.47,149.55 162.54,154.42 165.61,157.86 168.67,159.52 171.74,159.40 174.81,157.81 177.88,156.37 180.94,156.80 184.01,159.45 187.08,164.34 190.15,171.14 193.21,178.89 196.28,186.87 199.35,194.98 202.42,203.20 205.48,211.04 208.55,217.47 211.62,221.94 214.69,224.43 217.75,225.02 220.82,224.58 223.89,224.36 226.95,224.80 230.02,225.89 233.09,227.55 236.16,229.27 239.22,230.55 242.29,231.26 245.36,231.41 248.43,231.43 251.49,232.58 254.56,235.85 257.63,241.33 260.70,248.99 263.76,257.89 266.83,266.16 269.90,272.82 272.97,277.82 276.03,281.29 279.10,284.57 282.17,289.53 285.24,296.82 288.30,306.46 291.37,318.15 294.44,330.38 297.51,341.62 300.57,351.55 303.64,360.17 306.71,367.29 309.78,372.37 312.84,374.99 315.91,375.11 318.98,372.75 322.04,368.41 325.11,363.09 328.18,357.33 331.25,351.13 334.31,344.65 337.38,339.41 340.45,337.46 343.52,339.54 346.58,345.65 349.65,355.17 352.72,364.99 355.79,372.00 358.85,375.55 361.92,375.66 364.99,373.00 368.06,369.58 371.12,366.86 374.19,365.01 377.26,364.02 380.33,363.79 383.39,364.14 386.46,364.96 389.53,366.26 392.60,368.03 395.66,370.16 398.73,372.53 401.80,375.07 404.86,377.81 407.93,380.84 411.00,384.74 414.07,390.09 417.13,396.99 420.20,405.44 423.27,414.72 426.34,422.74 429.40,428.00 432.47,430.33 435.54,429.75 438.61,426.38 441.67,420.46 444.74,412.12 447.81,401.37 450.88,388.40 453.94,375.08 457.01,363.88 460.08,355.65 463.15,350.40 466.21,347.94 469.28,347.51 472.35,348.30 475.42,350.17 478.48,353.11 481.55,356.88 484.62,360.76 487.69,364.21 490.75,367.20 493.82,369.72 496.89,371.69 499.95,372.96 503.02,373.45 506.09,373.17 509.16,372.22 512.22,371.70 515.29,373.05 518.36,376.74 521.43,382.78 524.49,390.69 527.56,398.25 530.63,403.32 533.70,405.47 536.76,404.72 539.83,401.85 542.90,399.02 545.97,397.75 549.03,398.20 552.10,400.34 555.17,403.65 558.24,407.18 561.30,410.45 564.37,413.45 567.44,416.20 570.51,418.88 573.57,421.75 576.64,424.89 579.71,428.29 582.78,431.84 585.84,434.92 588.91,436.96 591.98,437.85 595.04,437.60 598.11,436.46 601.18,435.16 604.25,434.20 607.31,433.64 610.38,433.43 613.45,433.02 616.52,431.40 619.58,428.07 622.65,423.02 625.72,416.38 628.79,409.49 631.85,404.01 634.92,400.49 637.99,398.93 641.06,399.17 644.12,400.47 647.19,402.13 650.26,404.03 653.33,406.17 656.39,408.36 659.46,410.14 662.53,411.18 665.60,411.44 668.66,410.93 671.73,409.58 674.80,407.27 677.86,403.97 680.93,399.67 684.00,395.38 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,109.88 76.65,114.99 79.72,119.74 82.79,122.87 85.85,124.38 88.92,124.46 91.99,123.50 95.06,121.72 98.12,119.14 101.19,115.88 104.26,113.54 107.33,114.35 110.39,119.18 113.46,128.02 116.53,140.16 119.60,151.58 122.66,158.05 125.73,158.61 128.80,153.29 131.86,143.43 134.93,133.35 138.00,126.38 141.07,122.91 144.13,122.91 147.20,125.55 150.27,129.15 153.34,132.76 156.40,136.36 159.47,139.92 162.54,143.31 165.61,146.32 168.67,148.89 171.74,151.02 174.81,152.86 177.88,155.33 180.94,159.36 184.01,165.17 187.08,172.74 190.15,181.62 193.21,190.34 196.28,197.79 199.35,203.84 202.42,208.50 205.48,211.77 208.55,213.68 211.62,214.24 214.69,213.46 217.75,211.48 220.82,209.92 223.89,211.03 226.95,215.64 230.02,223.76 233.09,234.93 236.16,246.75 239.22,256.75 242.29,264.42 245.36,269.75 248.43,272.90 251.49,274.33 254.56,274.41 257.63,273.18 260.70,270.67 263.76,268.15 266.83,268.07 269.90,271.75 272.97,279.25 276.03,290.36 279.10,302.85 282.17,313.61 285.24,321.55 288.30,326.67 291.37,329.29 294.44,331.23 297.51,334.30 300.57,338.89 303.64,344.98 306.71,352.00 309.78,358.22 312.84,362.36 315.91,364.27 318.98,363.97 322.04,361.68 325.11,357.84 328.18,352.67 331.25,346.19 334.31,338.57 337.38,331.43 340.45,327.03 343.52,326.13 346.58,328.76 349.65,334.51 352.72,341.41 355.79,347.45 358.85,352.24 361.92,355.78 364.99,358.38 368.06,360.94 371.12,364.14 374.19,368.03 377.26,372.61 380.33,377.49 383.39,381.89 386.46,385.43 389.53,388.10 392.60,389.94 395.66,391.45 398.73,393.34 401.80,395.81 404.86,398.89 407.93,402.38 411.00,405.39 414.07,407.01 417.13,407.09 420.20,405.60 423.27,402.91 426.34,400.00 429.40,397.58 432.47,395.73 435.54,394.43 438.61,393.31 441.67,391.67 444.74,389.15 447.81,385.73 450.88,381.51 453.94,377.53 457.01,375.14 460.08,374.81 463.15,376.52 466.21,379.89 469.28,382.95 472.35,383.78 475.42,382.01 478.48,377.64 481.55,371.44 484.62,365.54 487.69,361.48 490.75,359.41 493.82,359.29 496.89,360.50 499.95,361.84 503.02,362.70 506.09,363.07 509.16,363.00 512.22,362.99 515.29,363.74 518.36,365.46 521.43,368.14 524.49,371.74 527.56,375.95 530.63,380.49 533.70,385.31 536.76,390.40 539.83,395.58 542.90,400.35 545.97,404.37 549.03,407.59 552.10,410.04 555.17,411.97 558.24,413.90 561.30,416.08 564.37,418.50 567.44,421.12 570.51,423.29 573.57,424.23 576.64,423.67 579.71,421.60 582.78,418.24 585.84,414.60 588.91,411.62 591.98,409.47 595.04,408.17 598.11,407.46 601.18,406.71 604.25,405.48 607.31,403.70 610.38,401.41 613.45,398.89 616.52,396.68 619.58,395.03 622.65,393.95 625.72,393.44 628.79,393.46 631.85,393.95 634.92,394.91 637.99,396.32 641.06,398.07 644.12,399.60 647.19,400.35 650.26,400.25 653.33,399.28 656.39,397.87 659.46,397.11 662.53,397.76 665.60,399.88 668.66,403.46 671.73,408.11 674.80,413.16 677.86,418.26 680.93,423.41 684.00,427.77 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,134.10 76.65,133.87 79.72,134.18 82.79,135.18 85.85,136.88 88.92,138.95 91.99,140.74 95.06,141.88 98.12,142.36 101.19,142.21 104.26,141.90 107.33,142.11 110.39,143.09 113.46,144.84 116.53,147.14 119.60,148.73 122.66,148.28 125.73,145.50 128.80,140.38 131.86,133.76 134.93,128.24 138.00,125.83 141.07,126.75 144.13,130.98 147.20,137.20 150.27,142.75 153.34,146.15 156.40,147.33 159.47,146.42 162.54,144.81 165.61,144.46 168.67,146.10 171.74,149.74 174.81,155.13 177.88,160.97 180.94,165.89 184.01,169.61 187.08,172.13 190.15,173.86 193.21,176.14 196.28,179.98 199.35,185.50 202.42,192.66 205.48,200.88 208.55,208.95 211.62,216.23 214.69,222.69 217.75,228.31 220.82,233.04 223.89,236.80 226.95,239.54 230.02,241.28 233.09,242.14 236.16,242.84 239.22,244.10 242.29,246.07 245.36,248.76 248.43,252.24 251.49,256.74 254.56,262.44 257.63,269.36 260.70,277.46 263.76,286.07 266.83,293.83 269.90,300.02 272.97,304.60 276.03,307.61 279.10,309.40 282.17,310.46 285.24,310.96 288.30,310.91 291.37,310.36 294.44,309.61 297.51,308.96 300.57,308.47 303.64,308.15 306.71,308.27 309.78,309.69 312.84,313.04 315.91,318.38 318.98,325.68 322.04,334.25 325.11,342.73 328.18,350.41 331.25,357.26 334.31,363.22 337.38,367.76 340.45,370.18 343.52,370.22 346.58,367.88 349.65,363.51 352.72,358.85 355.79,355.68 358.85,354.35 361.92,354.86 364.99,356.77 368.06,358.84 371.12,360.13 374.19,360.54 377.26,360.11 380.33,359.76 383.39,361.24 386.46,365.45 389.53,372.43 392.60,382.01 395.66,392.34 398.73,400.95 401.80,407.01 404.86,410.50 407.93,411.66 411.00,411.67 414.07,411.70 417.13,411.98 420.20,412.51 423.27,413.06 426.34,412.99 429.40,411.82 432.47,409.50 435.54,406.06 438.61,401.87 441.67,397.66 444.74,393.80 447.81,390.31 450.88,387.16 453.94,384.20 457.01,381.20 460.08,378.10 463.15,374.89 466.21,371.63 469.28,368.56 472.35,365.94 475.42,363.80 478.48,362.15 481.55,360.87 484.62,359.63 487.69,358.20 490.75,356.55 493.82,354.71 496.89,353.03 499.95,352.21 503.02,352.60 506.09,354.21 509.16,357.01 512.22,360.70 515.29,364.87 518.36,369.39 521.43,374.27 524.49,379.41 527.56,384.45 530.63,389.02 533.70,393.05 536.76,396.54 539.83,399.64 542.90,402.77 545.97,406.24 549.03,410.08 552.10,414.27 555.17,418.61 558.24,422.72 561.30,426.43 564.37,429.71 567.44,432.56 570.51,434.74 573.57,435.96 576.64,436.12 579.71,435.22 582.78,433.41 585.84,431.39 588.91,429.81 591.98,428.79 595.04,428.34 598.11,428.07 601.18,426.93 604.25,424.20 607.31,419.80 610.38,413.76 613.45,406.77 616.52,400.03 619.58,394.15 622.65,389.14 625.72,385.05 628.79,382.18 631.85,380.94 634.92,381.45 637.99,383.72 641.06,387.62 644.12,392.52 647.19,397.86 650.26,403.53 653.33,409.54 656.39,415.75 659.46,421.86 662.53,427.65 665.60,433.10 668.66,438.20 671.73,442.72 674.80,446.25 677.86,448.60 680.93,449.76 684.00,449.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,151.18 76.65,147.49 79.72,144.50 82.79,143.23 85.85,143.64 88.92,144.83 91.99,144.95 95.06,142.93 98.12,138.73 101.19,132.46 104.26,125.44 107.33,119.58 110.39,115.59 113.46,113.46 116.53,113.15 119.60,114.25 122.66,116.36 125.73,119.40 128.80,123.35 131.86,127.90 134.93,131.99 138.00,134.82 141.07,136.28 144.13,136.41 147.20,135.80 150.27,135.65 153.34,136.63 156.40,138.77 159.47,142.05 162.54,146.10 165.61,150.44 168.67,154.88 171.74,159.41 174.81,164.03 177.88,168.64 180.94,173.18 184.01,177.61 187.08,181.93 190.15,186.06 193.21,189.68 196.28,192.56 199.35,194.67 202.42,196.04 205.48,197.22 208.55,199.32 211.62,202.97 214.69,208.17 217.75,214.87 220.82,222.28 223.89,229.30 226.95,235.55 230.02,241.02 233.09,245.75 236.16,250.03 239.22,254.11 242.29,258.08 245.36,261.92 248.43,265.80 251.49,270.25 254.56,275.65 257.63,282.05 260.70,289.42 263.76,296.86 266.83,302.62 269.90,305.77 272.97,306.25 276.03,304.22 279.10,301.12 282.17,298.97 285.24,298.49 288.30,299.68 291.37,302.41 294.44,305.99 297.51,309.74 300.57,313.50 303.64,317.28 306.71,321.09 309.78,324.95 312.84,328.89 315.91,332.91 318.98,337.01 322.04,341.27 325.11,345.82 328.18,350.73 331.25,356.01 334.31,361.59 337.38,366.77 340.45,370.60 343.52,372.74 346.58,373.19 349.65,372.01 352.72,369.52 355.79,366.01 358.85,361.56 361.92,356.17 364.99,350.54 368.06,346.71 371.12,346.21 374.19,349.18 377.26,355.57 380.33,363.91 383.39,371.37 386.46,376.48 389.53,379.18 392.60,379.60 395.66,379.04 398.73,379.24 401.80,380.80 404.86,383.71 407.93,387.81 411.00,392.18 414.07,395.93 417.13,398.88 420.20,401.03 423.27,402.43 426.34,403.24 429.40,403.55 432.47,403.39 435.54,402.75 438.61,401.61 441.67,399.94 444.74,397.73 447.81,394.97 450.88,391.74 453.94,388.63 457.01,386.46 460.08,385.49 463.15,385.73 466.21,386.98 469.28,388.32 472.35,388.83 475.42,388.33 478.48,386.82 481.55,384.42 484.62,381.43 487.69,378.08 490.75,374.39 493.82,370.40 496.89,366.91 499.95,365.39 503.02,366.59 506.09,370.55 509.16,377.08 512.22,384.48 515.29,390.54 518.36,394.50 521.43,396.38 524.49,396.38 527.56,395.57 530.63,394.94 533.70,394.71 536.76,394.86 539.83,395.39 542.90,396.31 545.97,397.59 549.03,399.25 552.10,401.27 555.17,403.34 558.24,404.87 561.30,405.58 564.37,405.46 567.44,404.56 570.51,403.32 573.57,402.33 576.64,401.78 579.71,401.66 582.78,401.82 585.84,401.49 588.91,399.96 591.98,397.10 595.04,392.90 598.11,387.96 601.18,383.82 604.25,381.59 607.31,381.37 610.38,383.14 613.45,386.40 616.52,390.28 619.58,394.33 622.65,398.55 625.72,402.86 628.79,406.72 631.85,409.41 634.92,410.72 637.99,410.63 641.06,409.37 644.12,407.91 647.19,407.19 650.26,407.36 653.33,408.44 656.39,410.15 659.46,411.81 662.53,412.92 665.60,413.46 668.66,413.41 671.73,412.72 674.80,411.30 677.86,409.11 680.93,406.13 684.00,403.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,89.88 76.65,86.32 79.72,84.27 82.79,84.94 85.85,88.29 88.92,93.79 91.99,100.32 95.06,107.28 98.12,114.62 101.19,122.30 104.26,129.78 107.33,136.29 110.39,141.55 113.46,145.55 116.53,148.38 119.60,150.50 122.66,152.43 125.73,154.26 128.80,156.00 131.86,157.41 134.93,157.73 138.00,156.38 141.07,153.29 144.13,148.49 147.20,142.78 150.27,137.81 153.34,134.49 156.40,132.86 159.47,132.85 162.54,133.62 165.61,133.98 168.67,133.50 171.74,132.17 174.81,130.39 177.88,130.35 180.94,134.35 184.01,142.87 187.08,155.92 190.15,172.42 193.21,189.09 196.28,203.40 199.35,215.07 202.42,224.10 205.48,230.58 208.55,234.67 211.62,236.47 214.69,235.98 217.75,233.34 220.82,229.98 223.89,227.93 226.95,227.91 230.02,229.93 233.09,233.70 236.16,237.68 239.22,240.27 242.29,241.14 245.36,240.29 248.43,238.23 251.49,236.50 254.56,236.29 257.63,237.71 260.70,240.76 263.76,245.36 266.83,251.33 269.90,258.58 272.97,267.11 276.03,276.88 279.10,287.45 282.17,298.24 285.24,309.03 288.30,319.82 291.37,330.55 294.44,340.87 297.51,350.42 300.57,359.12 303.64,366.99 306.71,373.43 309.78,376.76 312.84,375.69 315.91,370.09 318.98,360.04 322.04,347.36 325.11,335.60 328.18,326.64 331.25,320.57 334.31,317.29 337.38,315.83 340.45,314.86 343.52,313.93 346.58,313.03 349.65,312.51 352.72,314.11 355.79,319.61 358.85,329.34 361.92,343.32 364.99,360.22 368.06,376.21 371.12,388.46 374.19,396.69 377.26,400.93 380.33,402.43 383.39,403.58 386.46,405.59 389.53,408.54 392.60,412.33 395.66,416.10 398.73,418.70 401.80,419.72 404.86,419.18 407.93,417.06 411.00,413.38 414.07,408.15 417.13,401.38 420.20,393.06 423.27,384.03 426.34,376.64 429.40,372.63 432.47,372.17 435.54,375.21 438.61,380.44 441.67,385.41 444.74,388.87 447.81,390.77 450.88,391.13 453.94,390.20 457.01,388.34 460.08,385.64 463.15,382.11 466.21,378.04 469.28,374.76 472.35,373.61 475.42,374.85 478.48,378.47 481.55,383.94 484.62,389.78 487.69,394.91 490.75,399.24 493.82,402.77 496.89,405.56 499.95,407.73 503.02,409.33 506.09,410.37 509.16,410.81 512.22,410.30 515.29,408.38 518.36,404.89 521.43,399.84 524.49,393.42 527.56,386.57 530.63,380.18 533.70,374.44 536.76,369.34 539.83,365.10 542.90,362.27 545.97,361.27 549.03,362.14 552.10,364.85 555.17,368.88 558.24,373.30 561.30,377.63 564.37,381.86 567.44,385.98 570.51,390.00 573.57,393.92 576.64,397.75 579.71,401.47 582.78,405.11 585.84,408.69 588.91,412.24 591.98,415.77 595.04,419.29 598.11,422.73 601.18,425.94 604.25,428.82 607.31,431.37 610.38,433.57 613.45,435.31 616.52,436.37 619.58,436.65 622.65,436.15 625.72,434.88 628.79,433.09 631.85,431.06 634.92,428.88 637.99,426.56 641.06,424.09 644.12,421.41 647.19,418.48 650.26,415.29 653.33,411.84 656.39,408.43 659.46,405.85 662.53,404.63 665.60,404.82 668.66,406.41 671.73,409.06 674.80,412.17 677.86,415.46 680.93,418.90 684.00,421.90 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,139.85 76.65,145.30 79.72,148.83 82.79,148.72 85.85,145.02 88.92,138.99 91.99,133.22 95.06,129.18 98.12,126.94 101.19,126.46 104.26,127.30 107.33,128.86 110.39,130.90 113.46,133.41 116.53,136.28 119.60,138.84 122.66,140.40 125.73,140.80 128.80,140.05 131.86,138.20 134.93,135.44 138.00,131.91 141.07,127.61 144.13,122.60 147.20,117.83 150.27,115.30 153.34,116.09 156.40,120.26 159.47,127.64 162.54,136.53 165.61,144.45 168.67,150.52 171.74,154.73 174.81,157.43 177.88,160.65 180.94,166.48 184.01,175.36 187.08,187.30 190.15,201.16 193.21,213.42 196.28,221.40 199.35,224.79 202.42,223.64 205.48,219.17 208.55,213.85 211.62,209.01 214.69,204.73 217.75,201.09 220.82,199.05 223.89,199.99 226.95,204.38 230.02,212.23 233.09,223.16 236.16,235.11 239.22,245.98 242.29,255.32 245.36,263.13 248.43,269.32 251.49,273.63 254.56,275.87 257.63,276.01 260.70,274.10 263.76,271.45 266.83,270.64 269.90,273.06 272.97,278.76 276.03,287.60 279.10,297.92 282.17,307.44 285.24,315.34 288.30,321.62 291.37,326.39 294.44,330.18 297.51,333.55 300.57,336.62 303.64,339.39 306.71,341.81 309.78,343.80 312.84,345.28 315.91,346.24 318.98,346.67 322.04,346.52 325.11,345.66 328.18,344.03 331.25,341.61 334.31,338.47 337.38,335.15 340.45,332.40 343.52,330.47 346.58,329.38 349.65,329.15 352.72,330.05 355.79,332.30 358.85,335.97 361.92,341.03 364.99,347.10 368.06,352.99 371.12,357.82 374.19,361.51 377.26,364.08 380.33,366.15 383.39,368.91 386.46,372.98 389.53,378.38 392.60,385.05 395.66,392.37 398.73,399.50 401.80,406.14 404.86,412.30 407.93,417.82 411.00,421.93 414.07,423.84 417.13,423.40 420.20,420.63 423.27,416.10 426.34,411.47 429.40,407.96 432.47,405.70 435.54,404.65 438.61,404.15 441.67,402.97 444.74,400.47 447.81,396.62 450.88,391.48 453.94,385.61 457.01,379.75 460.08,374.15 463.15,368.80 466.21,363.81 469.28,359.57 472.35,356.50 475.42,354.68 478.48,354.10 481.55,354.88 484.62,357.32 487.69,361.64 490.75,367.88 493.82,375.96 496.89,384.73 499.95,392.01 503.02,396.67 506.09,398.69 509.16,398.19 512.22,396.30 515.29,394.52 518.36,393.34 521.43,392.76 524.49,392.73 527.56,392.90 530.63,392.98 533.70,392.90 536.76,392.67 539.83,392.36 542.90,392.16 545.97,392.22 549.03,392.54 552.10,393.14 555.17,393.96 558.24,394.92 561.30,395.96 564.37,397.10 567.44,398.31 570.51,399.41 573.57,400.15 576.64,400.46 579.71,400.34 582.78,399.82 585.84,399.02 588.91,398.08 591.98,397.00 595.04,395.80 598.11,394.74 601.18,394.52 604.25,395.63 607.31,398.12 610.38,401.96 613.45,406.26 616.52,409.45 619.58,410.75 622.65,410.14 625.72,407.73 628.79,404.54 631.85,401.85 634.92,400.09 637.99,399.25 641.06,399.09 644.12,398.51 647.19,396.48 650.26,392.79 653.33,387.47 656.39,381.33 659.46,376.55 662.53,374.64 665.60,375.75 668.66,379.80 671.73,385.42 674.80,390.15 677.86,392.81 680.93,393.36 684.00,392.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,143.43 76.65,134.29 79.72,127.15 82.79,124.61 85.85,126.64 88.92,132.05 91.99,138.43 95.06,144.39 98.12,149.88 101.19,154.86 104.26,159.01 107.33,161.85 110.39,163.20 113.46,163.07 116.53,161.47 119.60,158.53 122.66,154.37 125.73,149.02 128.80,142.49 131.86,135.27 134.93,128.93 138.00,124.70 141.07,122.71 144.13,122.94 147.20,124.97 150.27,127.88 153.34,131.20 156.40,134.89 159.47,138.98 162.54,143.89 165.61,150.20 168.67,158.11 171.74,167.63 174.81,178.39 177.88,188.38 180.94,195.52 184.01,199.35 187.08,199.89 190.15,197.64 193.21,194.26 196.28,190.99 199.35,187.97 202.42,185.21 205.48,183.14 208.55,182.57 211.62,183.97 214.69,187.34 217.75,192.66 220.82,199.62 223.89,207.79 226.95,216.99 230.02,227.24 233.09,238.27 236.16,248.74 239.22,257.25 242.29,263.51 245.36,267.52 248.43,269.66 251.49,271.11 254.56,272.75 257.63,274.68 260.70,276.91 263.76,279.57 266.83,282.93 269.90,287.14 272.97,292.21 276.03,298.11 279.10,304.47 282.17,310.80 285.24,316.94 288.30,322.89 291.37,328.52 294.44,333.30 297.51,336.65 300.57,338.47 303.64,338.75 306.71,337.73 309.78,336.10 312.84,334.40 315.91,332.69 318.98,330.95 322.04,329.28 325.11,327.83 328.18,326.70 331.25,325.88 334.31,325.42 337.38,325.73 340.45,327.37 343.52,330.54 346.58,335.24 349.65,341.35 352.72,348.28 355.79,355.40 358.85,362.61 361.92,369.90 364.99,376.99 368.06,383.03 371.12,387.42 374.19,390.08 377.26,391.03 380.33,390.68 383.39,389.78 386.46,388.74 389.53,387.57 392.60,386.26 395.66,384.72 398.73,382.85 401.80,380.60 404.86,377.97 407.93,375.04 411.00,372.26 414.07,370.06 417.13,368.52 420.20,367.64 423.27,367.67 426.34,369.33 429.40,373.13 432.47,379.13 435.54,387.26 438.61,396.09 441.67,402.92 444.74,406.36 447.81,406.34 450.88,403.04 453.94,398.18 457.01,394.00 460.08,391.27 463.15,390.00 466.21,390.12 469.28,391.37 472.35,393.47 475.42,396.36 478.48,400.05 481.55,403.91 484.62,406.22 487.69,405.72 490.75,402.30 493.82,396.00 496.89,387.92 499.95,380.10 503.02,373.57 506.09,368.37 509.16,364.52 512.22,362.21 515.29,361.72 518.36,363.11 521.43,366.40 524.49,371.30 527.56,376.45 530.63,380.55 533.70,383.35 536.76,384.85 539.83,385.39 542.90,385.87 545.97,386.95 549.03,388.69 552.10,391.08 555.17,393.99 558.24,397.17 561.30,400.50 564.37,403.96 567.44,407.54 570.51,411.06 573.57,414.30 576.64,417.17 579.71,419.69 582.78,421.83 585.84,423.57 588.91,424.87 591.98,425.73 595.04,426.15 598.11,426.24 601.18,426.36 604.25,426.73 607.31,427.38 610.38,428.29 613.45,428.94 616.52,428.43 619.58,426.32 622.65,422.57 625.72,417.32 628.79,411.54 631.85,406.53 634.92,402.69 637.99,400.02 641.06,398.41 644.12,397.37 647.19,396.45 650.26,395.56 653.33,394.70 656.39,393.78 659.46,392.53 662.53,390.79 665.60,388.54 668.66,385.77 671.73,382.45 674.80,378.52 677.86,373.93 680.93,368.70 684.00,363.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,48.00 76.65,59.25 79.72,70.92 82.79,80.47 85.85,87.90 88.92,93.38 91.99,97.21 95.06,99.58 98.12,100.50 101.19,100.10 104.26,100.02 107.33,102.59 110.39,108.68 113.46,118.32 116.53,130.97 119.60,143.81 122.66,153.82 125.73,160.35 128.80,163.39 131.86,163.32 134.93,161.30 138.00,158.26 141.07,154.29 144.13,149.42 147.20,144.47 150.27,141.10 153.34,140.23 156.40,141.89 159.47,146.01 162.54,151.56 165.61,157.14 168.67,162.20 171.74,166.75 174.81,170.84 177.88,174.75 180.94,178.77 184.01,182.96 187.08,187.32 190.15,191.78 193.21,196.07 196.28,200.01 199.35,203.57 202.42,206.74 205.48,209.42 208.55,211.38 211.62,212.48 214.69,212.73 217.75,212.20 220.82,211.64 223.89,212.10 226.95,213.97 230.02,217.24 233.09,221.69 236.16,226.07 239.22,229.11 242.29,230.53 245.36,230.35 248.43,229.18 251.49,228.97 254.56,231.17 257.63,235.93 260.70,243.25 263.76,252.59 266.83,262.93 269.90,273.72 272.97,284.91 276.03,296.45 279.10,307.56 282.17,317.17 285.24,324.89 288.30,330.72 291.37,334.87 294.44,338.33 297.51,342.15 300.57,346.53 303.64,351.47 306.71,356.58 309.78,360.66 312.84,362.82 315.91,362.98 318.98,361.15 322.04,357.78 325.11,353.73 328.18,349.47 331.25,345.02 334.31,340.43 337.38,336.24 340.45,333.22 343.52,331.62 346.58,331.45 349.65,332.72 352.72,335.57 355.79,340.11 358.85,346.39 361.92,354.39 364.99,363.53 368.06,372.15 371.12,379.00 374.19,383.94 377.26,387.01 380.33,388.71 383.39,390.00 386.46,391.39 389.53,392.91 392.60,394.52 395.66,396.13 398.73,397.55 401.80,398.72 404.86,399.66 407.93,400.40 411.00,401.16 414.07,402.18 417.13,403.48 420.20,405.08 423.27,406.72 426.34,407.71 429.40,407.54 432.47,406.15 435.54,403.56 438.61,400.18 441.67,396.77 444.74,393.72 447.81,391.06 450.88,388.77 453.94,386.68 457.01,384.60 460.08,382.45 463.15,380.23 466.21,377.83 469.28,374.74 472.35,370.42 475.42,364.80 478.48,357.87 481.55,350.11 484.62,342.92 487.69,337.29 490.75,333.32 493.82,331.01 496.89,330.36 499.95,331.39 503.02,334.12 506.09,338.53 509.16,344.58 512.22,351.65 515.29,358.95 518.36,366.22 521.43,373.46 524.49,380.51 527.56,386.69 530.63,391.29 533.70,394.20 536.76,395.41 539.83,395.39 542.90,395.40 545.97,396.34 549.03,398.29 552.10,401.26 555.17,404.98 558.24,409.01 561.30,413.14 564.37,417.35 567.44,421.58 570.51,425.22 573.57,427.46 576.64,428.07 579.71,427.04 582.78,424.60 585.84,421.88 588.91,419.95 591.98,418.99 595.04,419.01 598.11,419.94 601.18,421.56 604.25,423.72 607.31,426.42 610.38,429.62 613.45,432.72 616.52,434.64 619.58,434.86 622.65,433.34 625.72,430.19 628.79,426.24 631.85,422.55 634.92,419.48 637.99,417.01 641.06,415.20 644.12,414.28 647.19,414.46 650.26,415.79 653.33,418.26 656.39,421.45 659.46,424.23 662.53,425.83 665.60,426.16 668.66,425.26 671.73,423.45 674.80,421.34 677.86,419.23 680.93,417.11 684.00,415.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,95.66 76.65,95.93 79.72,97.13 82.79,99.40 85.85,102.72 88.92,107.06 91.99,112.28 95.06,118.33 98.12,125.20 101.19,132.79 104.26,140.03 107.33,145.35 110.39,148.16 113.46,148.47 116.53,146.47 119.60,143.36 122.66,140.38 125.73,137.79 128.80,135.60 131.86,133.82 134.93,132.45 138.00,131.51 141.07,130.98 144.13,130.89 147.20,131.42 150.27,132.97 153.34,135.75 156.40,139.78 159.47,144.96 162.54,150.32 165.61,154.44 168.67,156.81 171.74,157.42 174.81,156.50 177.88,155.20 180.94,154.72 184.01,155.34 187.08,157.04 190.15,159.93 193.21,164.26 196.28,170.26 199.35,177.94 202.42,187.28 205.48,197.56 208.55,207.38 211.62,215.95 214.69,223.24 217.75,229.26 220.82,234.21 223.89,238.36 226.95,241.81 230.02,244.55 233.09,246.74 236.16,249.21 239.22,252.81 242.29,257.71 245.36,263.92 248.43,271.00 251.49,277.63 254.56,282.83 257.63,286.48 260.70,288.59 263.76,289.35 266.83,289.14 269.90,288.17 272.97,286.44 276.03,284.09 279.10,282.52 282.17,283.67 285.24,288.22 288.30,296.19 291.37,307.06 294.44,318.24 297.51,327.06 300.57,332.99 303.64,336.03 306.71,336.46 309.78,335.19 312.84,332.87 315.91,329.57 318.98,325.32 322.04,320.97 325.11,318.12 328.18,317.63 331.25,319.54 334.31,323.72 337.38,328.99 340.45,333.72 343.52,337.35 346.58,339.86 349.65,341.57 352.72,344.03 355.79,348.83 358.85,356.27 361.92,366.36 364.99,378.22 368.06,389.36 371.12,397.90 374.19,403.67 377.26,406.69 380.33,407.64 383.39,407.82 386.46,407.92 389.53,407.97 392.60,407.92 395.66,407.35 398.73,405.69 401.80,402.74 404.86,398.50 407.93,393.24 411.00,388.30 414.07,385.01 417.13,383.63 420.20,384.15 423.27,386.20 426.34,388.65 429.40,390.68 432.47,392.22 435.54,393.25 438.61,393.75 441.67,393.64 444.74,392.86 447.81,391.43 450.88,389.43 453.94,387.68 457.01,387.24 460.08,388.51 463.15,391.46 466.21,395.62 469.28,398.60 472.35,398.06 475.42,393.55 478.48,385.07 481.55,373.85 484.62,363.32 487.69,355.93 490.75,351.94 493.82,351.30 496.89,353.32 499.95,356.65 503.02,360.64 506.09,365.25 509.16,370.46 512.22,376.02 515.29,381.59 518.36,387.06 521.43,392.45 524.49,397.63 527.56,402.07 530.63,405.27 533.70,407.13 536.76,407.64 539.83,406.94 542.90,405.35 545.97,403.12 549.03,400.27 552.10,396.83 555.17,393.36 558.24,390.85 561.30,389.82 564.37,390.29 567.44,392.19 570.51,395.00 573.57,398.00 576.64,400.98 579.71,403.93 582.78,406.87 585.84,409.83 588.91,412.88 591.98,416.01 595.04,419.23 598.11,422.21 601.18,424.11 604.25,424.33 607.31,422.82 610.38,419.61 613.45,415.57 616.52,412.27 619.58,410.47 622.65,410.20 625.72,411.34 628.79,412.89 631.85,413.55 634.92,412.90 637.99,410.96 641.06,408.00 644.12,405.39 647.19,404.39 650.26,405.22 653.33,407.90 656.39,411.99 659.46,416.40 662.53,420.35 665.60,423.77 668.66,426.67 671.73,429.02 674.80,430.80 677.86,432.00 680.93,432.62 684.00,432.73 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,74.66 76.65,72.94 79.72,73.73 82.79,77.98 85.85,85.66 88.92,95.82 91.99,106.46 95.06,116.48 98.12,125.82 101.19,134.42 104.26,141.85 107.33,147.45 110.39,150.98 113.46,152.43 116.53,151.97 119.60,150.54 122.66,149.14 125.73,147.98 128.80,147.06 131.86,146.40 134.93,146.02 138.00,145.95 141.07,146.18 144.13,146.70 147.20,147.10 150.27,146.54 153.34,144.55 156.40,141.11 159.47,136.37 162.54,132.06 165.61,130.60 168.67,132.89 171.74,138.93 174.81,148.32 177.88,158.74 180.94,167.83 184.01,175.07 187.08,180.45 190.15,184.31 193.21,187.73 196.28,191.50 199.35,195.72 202.42,200.37 205.48,204.77 208.55,207.54 211.62,207.95 214.69,205.95 217.75,201.77 220.82,197.55 223.89,196.34 226.95,199.23 230.02,206.24 233.09,216.91 236.16,228.86 239.22,239.60 242.29,248.63 245.36,255.93 248.43,261.79 251.49,267.04 254.56,272.32 257.63,277.70 260.70,283.16 263.76,288.67 266.83,294.11 269.90,299.43 272.97,304.62 276.03,309.69 279.10,314.65 282.17,319.54 285.24,324.34 288.30,329.08 291.37,333.59 294.44,337.13 297.51,338.91 300.57,338.77 303.64,336.73 306.71,333.54 309.78,331.51 312.84,332.35 315.91,336.25 318.98,343.14 322.04,351.58 325.11,358.73 328.18,363.09 331.25,364.61 334.31,363.36 337.38,360.15 340.45,356.11 343.52,351.63 346.58,346.70 349.65,341.50 352.72,336.89 355.79,333.77 358.85,332.31 361.92,332.50 364.99,334.41 368.06,338.24 371.12,344.14 374.19,352.11 377.26,362.12 380.33,373.14 383.39,383.21 386.46,391.33 389.53,397.43 392.60,401.60 395.66,404.46 398.73,406.89 401.80,409.17 404.86,411.31 407.93,413.21 411.00,414.32 414.07,414.12 417.13,412.50 420.20,409.47 423.27,405.52 426.34,402.05 429.40,400.12 432.47,399.82 435.54,401.11 438.61,403.26 441.67,404.84 444.74,405.12 447.81,404.07 450.88,401.67 453.94,397.57 457.01,391.33 460.08,382.81 463.15,371.99 466.21,359.46 469.28,347.95 472.35,340.14 475.42,336.55 478.48,337.18 481.55,341.34 484.62,347.09 487.69,353.01 490.75,358.97 493.82,364.95 496.89,370.58 499.95,375.14 503.02,378.26 506.09,379.95 509.16,380.23 512.22,379.45 515.29,378.07 518.36,376.22 521.43,373.91 524.49,371.40 527.56,369.89 530.63,370.54 533.70,373.58 536.76,379.00 539.83,386.16 542.90,393.27 545.97,399.09 549.03,403.48 552.10,406.46 555.17,408.26 558.24,409.29 561.30,409.77 564.37,409.71 567.44,409.17 570.51,408.69 573.57,409.01 576.64,410.36 579.71,412.74 582.78,415.93 585.84,418.98 588.91,420.96 591.98,421.69 595.04,421.18 598.11,419.48 601.18,416.73 604.25,413.04 607.31,408.42 610.38,402.89 613.45,397.05 616.52,391.99 619.58,388.23 622.65,385.81 625.72,384.73 628.79,385.14 631.85,387.23 634.92,391.05 637.99,396.61 641.06,403.66 644.12,411.06 647.19,417.75 650.26,423.54 653.33,428.42 656.39,432.47 659.46,435.91 662.53,438.87 665.60,441.38 668.66,443.44 671.73,445.27 674.80,447.24 677.86,449.54 680.93,452.18 684.00,454.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,87.87 76.65,87.11 79.72,88.06 82.79,91.27 85.85,96.73 88.92,103.84 91.99,111.38 95.06,118.68 98.12,125.69 101.19,132.39 104.26,138.36 107.33,143.04 110.39,146.19 113.46,147.83 116.53,148.05 119.60,147.41 122.66,146.52 125.73,145.51 128.80,144.37 131.86,143.18 134.93,142.17 138.00,141.55 141.07,141.31 144.13,141.46 147.20,141.79 150.27,141.88 153.34,141.50 156.40,140.63 159.47,139.35 162.54,138.50 165.61,139.29 168.67,142.13 171.74,147.05 174.81,153.91 177.88,161.98 180.94,170.52 184.01,179.37 187.08,188.51 190.15,197.51 193.21,205.00 196.28,209.91 199.35,212.13 202.42,211.69 205.48,209.29 208.55,206.37 211.62,203.69 214.69,201.30 217.75,199.28 220.82,198.51 223.89,200.26 226.95,204.97 230.02,212.64 233.09,222.79 236.16,232.79 239.22,239.97 242.29,243.75 245.36,244.13 248.43,242.08 251.49,240.52 254.56,241.68 257.63,245.78 260.70,252.81 263.76,261.80 266.83,270.86 269.90,278.99 272.97,286.13 276.03,292.39 279.10,298.65 282.17,306.16 285.24,315.38 288.30,326.30 291.37,338.50 294.44,349.75 297.51,357.78 300.57,362.13 303.64,362.79 306.71,360.28 309.78,356.08 312.84,351.32 315.91,346.11 318.98,340.48 322.04,335.39 325.11,332.69 328.18,333.33 331.25,337.38 334.31,344.62 337.38,353.09 340.45,360.10 343.52,364.71 346.58,366.91 349.65,366.91 352.72,365.77 355.79,364.57 358.85,363.52 361.92,362.62 364.99,361.88 368.06,361.30 371.12,360.90 374.19,360.68 377.26,360.64 380.33,361.14 383.39,362.82 386.46,366.03 389.53,370.78 392.60,376.99 395.66,383.85 398.73,390.26 401.80,395.84 404.86,400.60 407.93,404.48 411.00,407.29 414.07,408.81 417.13,409.00 420.20,407.88 423.27,405.74 426.34,403.44 429.40,401.63 432.47,400.37 435.54,399.63 438.61,398.64 441.67,395.95 444.74,390.82 447.81,383.23 450.88,373.42 453.94,363.73 457.01,357.30 460.08,355.16 463.15,357.33 466.21,363.28 469.28,370.54 472.35,376.64 475.42,381.11 478.48,383.96 481.55,385.45 484.62,386.35 487.69,387.21 490.75,388.08 493.82,388.96 496.89,389.70 499.95,390.06 503.02,389.90 506.09,389.22 509.16,388.08 512.22,386.97 515.29,386.58 518.36,387.11 521.43,388.58 524.49,390.82 527.56,393.09 530.63,394.67 533.70,395.42 536.76,395.35 539.83,394.58 542.90,393.50 545.97,392.37 549.03,391.22 552.10,390.06 555.17,389.28 558.24,389.63 561.30,391.46 564.37,394.78 567.44,399.46 570.51,404.31 573.57,407.74 576.64,409.27 579.71,408.88 582.78,406.85 585.84,404.53 588.91,403.19 591.98,403.05 595.04,404.13 598.11,406.30 601.18,409.26 604.25,412.79 607.31,416.88 610.38,421.47 613.45,425.72 616.52,428.04 619.58,427.68 622.65,424.60 625.72,418.98 628.79,412.34 631.85,406.65 634.92,402.52 637.99,399.95 641.06,398.70 644.12,397.65 647.19,395.73 650.26,392.77 653.33,388.77 656.39,383.90 659.46,378.68 662.53,373.46 665.60,368.27 668.66,363.11 671.73,358.05 674.80,353.21 677.86,348.65 680.93,344.37 684.00,340.97 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,142.53 76.65,140.88 79.72,139.65 82.79,139.32 85.85,139.89 88.92,141.23 91.99,143.09 95.06,145.33 98.12,147.93 101.19,150.89 104.26,153.97 107.33,156.89 110.39,159.52 113.46,161.86 116.53,163.75 119.60,164.23 122.66,162.30 125.73,157.74 128.80,150.55 131.86,141.63 134.93,133.81 138.00,129.30 141.07,128.35 144.13,130.91 147.20,135.69 150.27,140.06 153.34,142.57 156.40,143.14 159.47,141.91 162.54,140.36 165.61,140.61 168.67,143.43 171.74,148.83 174.81,156.46 177.88,164.41 180.94,170.68 184.01,174.84 187.08,176.91 190.15,177.18 193.21,176.62 196.28,175.98 199.35,175.33 202.42,174.68 205.48,174.39 208.55,175.15 211.62,177.34 214.69,180.99 217.75,186.10 220.82,192.90 223.89,201.69 226.95,212.57 230.02,225.56 233.09,240.22 236.16,254.37 239.22,265.74 242.29,273.86 245.36,278.72 248.43,280.81 251.49,281.62 254.56,282.27 257.63,282.87 260.70,283.44 263.76,284.09 266.83,285.04 269.90,286.42 272.97,288.22 276.03,290.50 279.10,293.61 282.17,298.07 285.24,304.08 288.30,311.62 291.37,320.27 294.44,327.82 297.51,332.03 300.57,332.43 303.64,329.03 306.71,322.72 309.78,316.21 312.84,311.50 315.91,308.81 318.98,308.14 322.04,309.24 325.11,311.68 328.18,315.22 331.25,319.84 334.31,325.52 337.38,331.94 340.45,338.68 343.52,345.59 346.58,352.68 349.65,359.82 352.72,366.49 355.79,372.13 358.85,376.62 361.92,379.98 364.99,382.25 368.06,383.59 371.12,384.11 374.19,383.83 377.26,382.78 380.33,381.94 383.39,383.14 386.46,387.36 389.53,394.64 392.60,404.75 395.66,415.66 398.73,424.59 401.80,430.60 404.86,433.68 407.93,433.97 411.00,432.17 414.07,428.98 417.13,424.52 420.20,418.81 423.27,412.20 426.34,405.70 429.40,400.07 432.47,395.37 435.54,391.60 438.61,388.60 441.67,386.03 444.74,383.72 447.81,381.69 450.88,379.89 453.94,378.15 457.01,376.21 460.08,373.98 463.15,371.46 466.21,368.78 469.28,366.50 472.35,365.20 475.42,364.98 478.48,365.84 481.55,367.42 484.62,368.75 487.69,369.09 490.75,368.39 493.82,366.66 496.89,364.37 499.95,362.42 503.02,361.24 506.09,360.86 509.16,361.29 512.22,362.66 515.29,365.14 518.36,368.78 521.43,373.58 524.49,379.42 527.56,385.66 530.63,391.70 533.70,397.42 536.76,402.83 539.83,407.64 542.90,411.11 545.97,412.70 549.03,412.36 552.10,410.13 555.17,406.86 558.24,404.11 561.30,402.65 564.37,402.51 567.44,403.64 570.51,405.56 573.57,407.67 576.64,409.77 579.71,411.84 582.78,413.86 585.84,415.63 588.91,416.95 591.98,417.79 595.04,418.16 598.11,418.25 601.18,418.55 604.25,419.43 607.31,420.93 610.38,423.02 613.45,425.25 616.52,426.81 619.58,427.29 622.65,426.67 625.72,424.99 628.79,422.37 631.85,418.99 634.92,414.92 637.99,410.16 641.06,404.85 644.12,399.68 647.19,395.29 650.26,391.80 653.33,389.21 656.39,387.46 659.46,386.37 662.53,385.83 665.60,385.84 668.66,386.36 671.73,386.96 674.80,386.81 677.86,385.55 680.93,383.14 684.00,380.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,113.00 76.65,112.98 79.72,112.63 82.79,111.91 85.85,110.82 88.92,110.02 91.99,110.90 95.06,114.20 98.12,119.97 101.19,128.06 104.26,136.75 107.33,143.58 110.39,147.62 113.46,148.86 116.53,147.49 119.60,144.60 122.66,141.34 125.73,137.96 128.80,134.46 131.86,130.99 134.93,128.03 138.00,125.97 141.07,124.85 144.13,124.66 147.20,125.44 150.27,127.22 153.34,130.04 156.40,133.91 159.47,138.76 162.54,144.12 165.61,149.28 168.67,153.97 171.74,158.21 174.81,162.05 177.88,165.86 180.94,170.04 184.01,174.65 187.08,179.70 190.15,184.91 193.21,189.47 196.28,192.74 199.35,194.64 202.42,195.19 205.48,195.18 208.55,196.15 211.62,198.93 214.69,203.56 217.75,210.00 220.82,217.86 223.89,226.57 226.95,235.91 230.02,245.89 233.09,256.25 236.16,265.56 239.22,272.38 242.29,276.40 245.36,277.61 248.43,276.43 251.49,274.04 254.56,271.37 257.63,268.51 260.70,265.48 263.76,262.80 266.83,261.48 269.90,262.06 272.97,264.57 276.03,268.99 279.10,275.02 282.17,282.27 285.24,290.60 288.30,300.00 291.37,310.39 294.44,321.25 297.51,332.08 300.57,342.76 303.64,353.29 306.71,363.01 309.78,369.95 312.84,372.65 315.91,370.95 318.98,364.90 322.04,355.93 325.11,346.81 328.18,339.01 331.25,332.59 334.31,327.60 337.38,324.54 340.45,324.08 343.52,326.48 346.58,331.71 349.65,339.48 352.72,348.17 355.79,356.17 358.85,363.16 361.92,369.12 364.99,373.94 368.06,377.27 371.12,378.83 374.19,378.61 377.26,376.63 380.33,373.83 383.39,371.96 386.46,371.94 389.53,373.81 392.60,377.51 395.66,382.37 398.73,387.51 401.80,392.61 404.86,397.68 407.93,402.63 411.00,407.05 414.07,410.54 417.13,413.02 420.20,414.48 423.27,414.80 426.34,413.61 429.40,410.62 432.47,405.82 435.54,399.25 438.61,391.94 441.67,385.80 444.74,381.85 447.81,380.12 450.88,380.49 453.94,381.91 457.01,382.93 460.08,383.08 463.15,382.37 466.21,380.76 469.28,378.21 472.35,374.63 475.42,370.01 478.48,364.35 481.55,358.32 484.62,353.76 487.69,351.98 490.75,353.13 493.82,357.15 496.89,363.09 499.95,369.14 503.02,374.41 506.09,378.85 509.16,382.49 512.22,385.52 515.29,388.19 518.36,390.58 521.43,392.70 524.49,394.54 527.56,396.03 530.63,397.11 533.70,397.79 536.76,398.06 539.83,397.94 542.90,397.50 545.97,396.77 549.03,395.76 552.10,394.49 555.17,393.40 558.24,393.28 561.30,394.53 564.37,397.17 567.44,401.07 570.51,405.26 573.57,408.44 576.64,410.19 579.71,410.51 582.78,409.55 585.84,408.00 588.91,406.53 591.98,405.25 595.04,404.18 598.11,403.33 601.18,402.79 604.25,402.62 607.31,402.82 610.38,403.39 613.45,404.18 616.52,404.94 619.58,405.55 622.65,406.00 625.72,406.30 628.79,406.55 631.85,406.89 634.92,407.35 637.99,407.92 641.06,408.69 644.12,409.96 647.19,412.03 650.26,414.96 653.33,418.73 656.39,422.91 659.46,426.31 662.53,428.11 665.60,428.23 668.66,426.71 671.73,424.08 674.80,421.33 677.86,418.93 680.93,416.90 684.00,415.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,153.20 76.65,151.10 79.72,149.63 82.79,149.42 85.85,150.43 88.92,152.13 91.99,153.37 95.06,153.52 98.12,152.53 101.19,150.45 104.26,147.63 107.33,144.59 110.39,141.51 113.46,138.41 116.53,135.35 119.60,132.78 122.66,131.16 125.73,130.60 128.80,131.09 131.86,132.38 134.93,133.69 138.00,134.40 141.07,134.45 144.13,133.85 147.20,133.18 150.27,133.63 153.34,135.86 156.40,139.90 159.47,145.64 162.54,152.03 165.61,157.56 168.67,161.67 171.74,164.35 174.81,165.67 177.88,166.01 180.94,165.76 184.01,165.02 187.08,163.77 190.15,162.49 193.21,162.57 196.28,165.11 199.35,170.24 202.42,177.90 205.48,186.98 208.55,195.20 211.62,201.34 214.69,205.34 217.75,207.32 220.82,208.51 223.89,210.64 226.95,214.34 230.02,219.62 233.09,226.25 236.16,233.10 239.22,238.98 242.29,243.65 245.36,247.10 248.43,249.77 251.49,253.00 254.56,257.79 257.63,264.24 260.70,272.34 263.76,281.25 266.83,289.33 269.90,295.72 272.97,300.37 276.03,303.38 279.10,305.81 282.17,309.11 285.24,313.79 288.30,319.87 291.37,327.03 294.44,333.65 297.51,338.09 300.57,339.99 303.64,339.37 306.71,336.90 309.78,334.58 312.84,333.91 315.91,335.05 318.98,337.98 322.04,342.12 325.11,346.35 328.18,350.09 331.25,353.30 334.31,356.03 337.38,358.59 340.45,361.45 343.52,364.75 346.58,368.50 349.65,372.57 352.72,376.28 355.79,378.95 358.85,380.43 361.92,380.74 364.99,379.78 368.06,377.32 371.12,373.20 374.19,367.39 377.26,359.96 380.33,352.32 383.39,347.21 386.46,346.07 389.53,348.94 392.60,355.69 395.66,364.83 398.73,374.40 401.80,383.70 404.86,392.75 407.93,401.39 411.00,408.92 414.07,414.62 417.13,418.36 420.20,420.13 423.27,420.13 426.34,418.86 429.40,416.70 432.47,413.70 435.54,409.85 438.61,405.38 441.67,400.67 444.74,395.92 447.81,391.16 450.88,386.40 453.94,381.94 457.01,378.18 460.08,375.24 463.15,373.12 466.21,371.67 469.28,370.17 472.35,367.90 475.42,364.72 478.48,360.64 481.55,356.07 484.62,352.22 487.69,349.94 490.75,349.32 493.82,350.35 496.89,352.95 499.95,356.96 503.02,362.29 506.09,368.96 509.16,376.81 512.22,384.55 515.29,390.46 518.36,393.98 521.43,395.11 524.49,394.10 527.56,392.19 530.63,390.58 533.70,389.49 536.76,388.92 539.83,388.87 542.90,389.31 545.97,390.23 549.03,391.64 552.10,393.52 555.17,395.76 558.24,398.16 561.30,400.61 564.37,403.12 567.44,405.68 570.51,408.24 573.57,410.74 576.64,413.17 579.71,415.51 582.78,417.80 585.84,420.10 588.91,422.49 591.98,424.98 595.04,427.58 598.11,429.94 601.18,431.15 604.25,430.57 607.31,428.14 610.38,423.89 613.45,418.45 616.52,412.99 619.58,408.07 622.65,403.71 625.72,399.98 628.79,397.57 631.85,397.34 634.92,399.57 637.99,404.27 641.06,410.96 644.12,417.56 647.19,422.08 650.26,424.17 653.33,423.83 656.39,421.56 659.46,418.67 662.53,416.09 665.60,413.90 668.66,412.10 671.73,410.86 674.80,410.48 677.86,411.10 680.93,412.73 684.00,414.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,145.96 76.65,152.36 79.72,158.31 82.79,162.23 85.85,164.11 88.92,164.15 91.99,162.75 95.06,160.12 98.12,156.28 101.19,151.27 104.26,145.63 107.33,140.12 110.39,135.04 113.46,130.38 116.53,126.19 119.60,122.73 122.66,120.28 125.73,118.89 128.80,118.56 131.86,119.35 134.93,121.41 138.00,124.84 141.07,129.68 144.13,135.87 147.20,142.47 150.27,147.54 153.34,149.99 156.40,149.77 159.47,147.05 162.54,143.51 165.61,141.57 168.67,142.12 171.74,145.17 174.81,150.51 177.88,157.11 180.94,163.88 184.01,170.57 187.08,177.18 190.15,183.40 193.21,188.22 196.28,190.88 199.35,191.29 202.42,189.49 205.48,186.57 208.55,184.72 211.62,185.12 214.69,187.82 217.75,192.75 220.82,198.94 223.89,205.05 226.95,210.62 230.02,215.62 233.09,220.28 236.16,225.75 239.22,233.20 242.29,242.89 245.36,254.81 248.43,268.32 251.49,281.48 254.56,292.81 257.63,302.15 260.70,309.50 263.76,314.89 266.83,318.40 269.90,320.07 272.97,319.89 276.03,317.96 279.10,315.21 282.17,312.90 285.24,311.51 288.30,311.03 291.37,311.52 294.44,313.36 297.51,316.88 300.57,322.18 303.64,329.24 306.71,337.33 309.78,344.24 312.84,348.34 315.91,349.46 318.98,347.63 322.04,344.17 325.11,341.64 328.18,341.36 331.25,343.42 334.31,347.62 337.38,352.23 340.45,354.87 343.52,354.72 346.58,351.76 349.65,346.36 352.72,340.38 355.79,335.67 358.85,332.60 361.92,331.19 364.99,331.25 368.06,332.32 371.12,334.02 374.19,336.33 377.26,339.27 380.33,343.36 383.39,349.61 386.46,358.53 389.53,370.16 392.60,384.29 395.66,399.00 398.73,411.72 401.80,421.54 404.86,428.48 407.93,432.59 411.00,434.27 414.07,433.89 417.13,431.53 420.20,427.19 423.27,421.21 426.34,414.54 429.40,407.90 432.47,401.35 435.54,394.93 438.61,389.17 441.67,385.13 444.74,383.33 447.81,383.80 450.88,386.35 453.94,389.20 457.01,389.97 460.08,387.87 463.15,382.89 466.21,375.48 469.28,367.81 472.35,362.01 475.42,358.49 478.48,357.25 481.55,357.87 484.62,359.12 487.69,360.14 490.75,360.85 493.82,361.25 496.89,361.48 499.95,361.80 503.02,362.34 506.09,363.11 509.16,364.12 512.22,365.56 515.29,367.65 518.36,370.49 521.43,374.07 524.49,378.35 527.56,383.14 530.63,388.27 533.70,393.69 536.76,399.41 539.83,405.11 542.90,409.95 545.97,413.31 549.03,415.14 552.10,415.48 555.17,415.17 558.24,415.75 561.30,417.98 564.37,421.89 567.44,427.35 570.51,433.21 573.57,437.96 576.64,441.11 579.71,442.66 582.78,442.66 585.84,441.38 588.91,439.07 591.98,435.76 595.04,431.47 598.11,426.58 601.18,422.13 604.25,418.86 607.31,416.83 610.38,416.04 613.45,416.21 616.52,416.83 619.58,417.66 622.65,418.70 625.72,419.88 628.79,420.73 631.85,420.59 634.92,419.29 637.99,416.81 641.06,413.21 644.12,408.81 647.19,403.87 650.26,398.45 653.33,392.54 656.39,386.22 659.46,379.63 662.53,372.91 665.60,366.05 668.66,359.10 671.73,352.77 674.80,348.36 677.86,346.47 680.93,347.14 684.00,349.46 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,87.82 76.65,89.76 79.72,91.77 82.79,93.41 85.85,94.70 88.92,96.31 91.99,99.61 95.06,105.37 98.12,113.64 101.19,124.24 104.26,135.20 107.33,143.66 110.39,148.56 113.46,149.88 116.53,147.95 119.60,144.48 122.66,141.30 125.73,138.81 128.80,137.00 131.86,135.81 134.93,135.04 138.00,134.52 141.07,134.23 144.13,134.18 147.20,134.53 150.27,135.64 153.34,137.69 156.40,140.70 159.47,144.64 162.54,149.31 165.61,154.42 168.67,159.84 171.74,165.60 174.81,171.68 177.88,178.10 180.94,184.90 184.01,192.06 187.08,199.60 190.15,206.99 193.21,212.65 196.28,215.34 199.35,214.94 202.42,211.49 205.48,206.09 208.55,200.97 211.62,197.35 214.69,195.28 217.75,194.77 220.82,195.94 223.89,198.92 226.95,203.77 230.02,210.50 233.09,218.81 236.16,227.21 239.22,234.13 242.29,239.25 245.36,242.57 248.43,244.72 251.49,247.61 254.56,252.67 257.63,260.07 260.70,269.76 263.76,280.76 266.83,291.10 269.90,299.73 272.97,306.60 276.03,311.74 279.10,315.44 282.17,318.12 285.24,319.91 288.30,320.82 291.37,321.03 294.44,321.42 297.51,322.91 300.57,325.68 303.64,329.73 306.71,334.71 309.78,339.59 312.84,343.58 315.91,346.61 318.98,348.68 322.04,350.05 325.11,351.23 328.18,352.48 331.25,353.82 334.31,355.22 337.38,356.42 340.45,357.09 343.52,357.09 346.58,356.43 349.65,355.22 352.72,354.09 355.79,353.66 358.85,354.05 361.92,355.27 364.99,357.14 368.06,359.19 371.12,361.07 374.19,362.74 377.26,364.21 380.33,365.51 383.39,366.73 386.46,367.90 389.53,369.02 392.60,370.13 395.66,371.51 398.73,373.55 401.80,376.39 404.86,380.01 407.93,384.49 411.00,390.09 414.07,397.09 417.13,405.53 420.20,415.41 423.27,425.69 426.34,433.38 429.40,436.32 432.47,434.29 435.54,427.34 438.61,417.10 441.67,406.63 444.74,397.48 447.81,389.72 450.88,383.35 453.94,378.28 457.01,374.39 460.08,371.66 463.15,370.08 466.21,369.58 469.28,369.82 472.35,370.47 475.42,371.47 478.48,372.82 481.55,374.45 484.62,376.18 487.69,377.89 490.75,379.56 493.82,381.18 496.89,382.62 499.95,383.65 503.02,384.15 506.09,384.10 509.16,383.55 512.22,382.85 515.29,382.47 518.36,382.55 521.43,383.12 524.49,384.05 527.56,384.93 530.63,385.31 533.70,385.11 536.76,384.33 539.83,383.25 542.90,382.61 545.97,382.95 549.03,384.31 552.10,386.68 555.17,389.88 558.24,393.54 561.30,397.48 564.37,401.71 567.44,406.16 570.51,410.31 573.57,413.51 576.64,415.54 579.71,416.39 582.78,416.17 585.84,415.40 588.91,414.55 591.98,413.72 595.04,412.89 598.11,412.05 601.18,411.11 604.25,410.01 607.31,408.75 610.38,407.32 613.45,405.94 616.52,404.94 619.58,404.50 622.65,404.63 625.72,405.31 628.79,406.32 631.85,407.41 634.92,408.50 637.99,409.58 641.06,410.73 644.12,412.26 647.19,414.47 650.26,417.42 653.33,421.10 656.39,425.08 659.46,428.25 662.53,429.80 665.60,429.68 668.66,427.90 671.73,425.04 674.80,422.07 677.86,419.49 680.93,417.32 684.00,415.76 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,47.43 76.65,50.83 79.72,55.71 82.79,61.59 85.85,68.48 88.92,76.36 91.99,85.16 95.06,94.87 98.12,105.47 101.19,116.88 104.26,128.03 107.33,137.41 110.39,144.44 113.46,149.12 116.53,151.47 119.60,151.57 122.66,149.54 125.73,145.39 128.80,139.12 131.86,131.59 134.93,125.48 138.00,122.85 141.07,123.96 144.13,128.76 147.20,136.36 150.27,144.92 153.34,153.40 156.40,161.76 159.47,169.94 162.54,177.42 165.61,183.40 168.67,187.61 171.74,190.03 174.81,190.73 177.88,189.98 180.94,188.07 184.01,185.07 187.08,180.98 190.15,176.21 193.21,172.06 196.28,169.53 199.35,168.71 202.42,169.61 205.48,172.22 208.55,176.51 211.62,182.46 214.69,190.06 217.75,199.22 220.82,208.77 223.89,217.06 226.95,223.50 230.02,228.09 233.09,231.01 236.16,233.22 239.22,235.71 242.29,238.68 245.36,242.14 248.43,246.06 251.49,250.40 254.56,255.11 257.63,260.18 260.70,265.62 263.76,271.42 266.83,277.59 269.90,284.11 272.97,291.00 276.03,298.23 279.10,305.56 282.17,312.69 285.24,319.49 288.30,325.97 291.37,331.92 294.44,336.26 297.51,337.92 300.57,336.66 303.64,332.49 306.71,326.56 309.78,322.27 312.84,322.18 315.91,326.57 318.98,335.34 322.04,346.69 325.11,357.04 328.18,364.52 331.25,369.04 334.31,370.69 337.38,370.38 340.45,369.34 343.52,368.02 346.58,366.41 349.65,364.43 352.72,361.64 355.79,357.62 358.85,352.29 361.92,345.64 364.99,338.66 368.06,334.23 371.12,334.49 374.19,339.65 377.26,349.61 380.33,362.06 383.39,372.54 386.46,378.73 389.53,380.53 392.60,378.19 395.66,374.20 398.73,371.92 401.80,372.49 404.86,375.92 407.93,381.98 411.00,389.56 414.07,397.55 417.13,405.71 420.20,414.06 423.27,422.29 426.34,429.51 429.40,435.09 432.47,438.96 435.54,441.10 438.61,441.18 441.67,438.55 444.74,432.89 447.81,424.17 450.88,412.60 453.94,400.06 457.01,389.10 460.08,380.54 463.15,374.41 466.21,370.50 469.28,367.91 472.35,365.73 475.42,363.79 478.48,362.09 481.55,360.59 484.62,359.22 487.69,357.90 490.75,356.63 493.82,355.42 496.89,354.55 499.95,354.55 503.02,355.69 506.09,357.97 509.16,361.34 512.22,365.18 515.29,368.70 518.36,371.63 521.43,373.99 524.49,375.84 527.56,377.59 530.63,379.63 533.70,382.03 536.76,384.79 539.83,387.93 542.90,391.51 545.97,395.57 549.03,400.11 552.10,405.13 555.17,410.61 558.24,416.53 561.30,422.87 564.37,429.62 567.44,436.68 570.51,443.07 573.57,447.52 576.64,449.61 579.71,449.34 582.78,446.95 585.84,443.51 588.91,440.08 591.98,436.85 595.04,433.80 598.11,430.90 601.18,428.01 604.25,425.05 607.31,422.00 610.38,418.86 613.45,415.66 616.52,412.44 619.58,409.20 622.65,405.95 625.72,402.73 628.79,399.87 631.85,397.80 634.92,396.65 637.99,396.43 641.06,397.05 644.12,398.16 647.19,399.45 650.26,400.85 653.33,402.35 656.39,403.89 659.46,405.24 662.53,406.25 665.60,406.92 668.66,407.24 671.73,407.44 674.80,407.86 677.86,408.68 680.93,409.91 684.00,411.23 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,98.28 76.65,101.52 79.72,104.83 82.79,107.45 85.85,109.41 88.92,111.33 91.99,114.48 95.06,119.59 98.12,126.68 101.19,135.62 104.26,144.77 107.33,151.78 110.39,155.78 113.46,156.75 116.53,155.02 119.60,152.35 122.66,150.61 125.73,150.22 128.80,151.17 131.86,153.07 134.93,154.70 138.00,155.08 141.07,154.11 144.13,151.81 147.20,148.90 150.27,146.80 153.34,146.33 156.40,147.50 159.47,150.24 162.54,153.55 165.61,155.98 168.67,157.03 171.74,156.68 174.81,155.14 177.88,153.49 180.94,152.88 184.01,153.55 187.08,155.50 190.15,158.79 193.21,163.56 196.28,169.95 199.35,177.97 202.42,187.59 205.48,197.95 208.55,207.34 211.62,214.82 214.69,220.36 217.75,224.03 220.82,226.61 223.89,229.22 226.95,232.25 230.02,235.71 233.09,239.53 236.16,243.34 239.22,246.75 242.29,249.67 245.36,252.12 248.43,254.32 251.49,256.98 254.56,260.65 257.63,265.38 260.70,271.16 263.76,277.63 266.83,284.08 269.90,290.13 272.97,295.77 276.03,300.99 279.10,305.86 282.17,310.45 285.24,314.79 288.30,318.88 291.37,322.71 294.44,326.22 297.51,329.36 300.57,332.12 303.64,334.50 306.71,336.36 309.78,337.27 312.84,336.93 315.91,335.29 318.98,332.41 322.04,329.55 325.11,329.16 328.18,332.51 331.25,339.68 334.31,350.41 337.38,362.18 340.45,371.52 343.52,377.23 346.58,379.30 349.65,378.11 352.72,375.53 355.79,373.45 358.85,372.25 361.92,371.93 364.99,372.27 368.06,372.61 371.12,372.46 374.19,371.78 377.26,370.58 380.33,369.13 383.39,367.94 386.46,367.31 389.53,367.23 392.60,367.77 395.66,369.57 398.73,373.47 401.80,379.78 404.86,388.50 407.93,399.01 411.00,408.35 414.07,413.53 417.13,413.97 420.20,409.69 423.27,401.98 426.34,394.55 429.40,390.10 432.47,388.92 435.54,390.95 438.61,395.03 441.67,398.95 444.74,401.58 447.81,402.89 450.88,402.83 453.94,401.01 457.01,396.93 460.08,390.43 463.15,381.49 466.21,370.80 469.28,361.62 472.35,357.15 475.42,358.02 478.48,364.20 481.55,374.10 484.62,383.14 487.69,388.04 490.75,388.49 493.82,384.56 496.89,377.92 499.95,371.68 503.02,367.41 506.09,365.18 509.16,364.91 512.22,365.92 515.29,367.30 518.36,368.77 521.43,370.31 524.49,372.00 527.56,374.14 530.63,377.01 533.70,380.67 536.76,385.13 539.83,390.00 542.90,394.27 545.97,397.20 549.03,398.73 552.10,398.88 555.17,398.21 558.24,397.75 561.30,398.00 564.37,398.98 567.44,400.67 570.51,402.86 573.57,405.29 576.64,407.86 579.71,410.58 582.78,413.38 585.84,415.99 588.91,418.16 591.98,419.84 595.04,421.02 598.11,421.98 601.18,423.43 604.25,425.87 607.31,429.36 610.38,433.86 613.45,438.68 616.52,442.57 619.58,444.92 622.65,445.71 625.72,445.01 628.79,443.33 631.85,441.36 634.92,439.32 637.99,437.21 641.06,434.98 644.12,432.45 647.19,429.42 650.26,425.86 653.33,421.77 656.39,417.25 659.46,412.58 662.53,407.92 665.60,403.31 668.66,398.75 671.73,394.49 674.80,390.96 677.86,388.38 680.93,386.75 684.00,386.04 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,99.61 76.65,103.02 79.72,107.52 82.79,112.58 85.85,118.20 88.92,124.30 91.99,130.76 95.06,137.50 98.12,144.53 101.19,151.76 104.26,158.32 107.33,162.91 110.39,165.08 113.46,164.82 116.53,162.25 119.60,158.07 122.66,153.03 125.73,147.29 128.80,140.85 131.86,134.28 134.93,129.32 138.00,127.35 141.07,128.52 144.13,132.79 147.20,138.79 150.27,143.77 153.34,146.18 156.40,145.95 159.47,143.24 162.54,139.72 165.61,137.78 168.67,138.29 171.74,141.25 174.81,146.44 177.88,152.60 180.94,158.42 184.01,163.62 187.08,168.20 190.15,172.30 193.21,176.41 196.28,180.89 199.35,185.77 202.42,191.05 205.48,196.41 208.55,201.23 211.62,205.18 214.69,208.23 217.75,210.43 220.82,212.21 223.89,214.17 226.95,216.53 230.02,219.29 233.09,222.54 236.16,226.79 239.22,232.52 242.29,239.86 245.36,248.80 248.43,258.78 251.49,268.14 254.56,275.61 257.63,281.05 260.70,284.50 263.76,286.71 266.83,289.22 269.90,292.84 272.97,297.61 276.03,303.51 279.10,310.33 282.17,317.79 285.24,325.81 288.30,334.36 291.37,343.16 294.44,350.60 297.51,355.10 300.57,356.30 303.64,354.21 306.71,349.64 309.78,344.95 312.84,341.93 315.91,340.76 318.98,341.43 322.04,343.30 325.11,345.17 328.18,346.41 331.25,346.99 334.31,346.96 337.38,346.82 340.45,347.29 343.52,348.60 346.58,350.76 349.65,353.53 352.72,355.73 355.79,356.18 358.85,354.64 361.92,351.11 364.99,346.26 368.06,342.03 371.12,339.84 374.19,339.84 377.26,342.01 380.33,345.77 383.39,350.00 386.46,354.10 389.53,358.06 392.60,361.93 395.66,366.17 398.73,371.43 401.80,377.93 404.86,385.66 407.93,394.51 411.00,403.87 414.07,413.13 417.13,422.19 420.20,431.02 423.27,439.21 426.34,445.47 429.40,448.90 432.47,449.39 435.54,446.96 438.61,441.78 441.67,434.16 444.74,424.27 447.81,412.12 450.88,397.89 453.94,383.21 457.01,370.27 460.08,359.79 463.15,351.80 466.21,346.25 469.28,343.04 472.35,342.03 475.42,343.21 478.48,346.56 481.55,351.54 484.62,356.57 487.69,360.54 490.75,363.32 493.82,364.93 496.89,365.87 499.95,367.02 503.02,368.83 506.09,371.32 509.16,374.48 512.22,378.13 515.29,382.03 518.36,386.13 521.43,390.40 524.49,394.87 527.56,399.57 530.63,404.52 533.70,409.75 536.76,415.24 539.83,420.68 542.90,425.18 545.97,428.13 549.03,429.46 552.10,429.20 555.17,427.79 558.24,426.09 561.30,424.50 564.37,423.05 567.44,421.69 570.51,420.10 573.57,417.87 576.64,414.87 579.71,411.08 582.78,406.81 585.84,403.39 588.91,402.11 591.98,403.22 595.04,406.70 598.11,411.80 601.18,416.47 604.25,419.27 607.31,420.08 610.38,418.91 613.45,416.55 616.52,414.38 619.58,413.09 622.65,412.70 625.72,413.15 628.79,414.07 631.85,414.95 634.92,415.63 637.99,416.10 641.06,416.12 644.12,414.55 647.19,410.29 650.26,403.16 653.33,393.17 656.39,381.58 659.46,371.81 662.53,366.19 665.60,364.94 668.66,367.99 671.73,373.70 674.80,379.18 677.86,383.03 680.93,385.20 684.00,385.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,105.24 76.65,106.75 79.72,109.77 82.79,114.30 85.85,120.30 88.92,127.20 91.99,133.80 95.06,139.42 98.12,144.04 101.19,147.67 104.26,150.61 107.33,153.30 110.39,155.89 113.46,158.38 116.53,160.64 119.60,161.84 122.66,161.16 125.73,158.39 128.80,153.54 131.86,146.92 134.93,139.52 138.00,132.11 141.07,124.78 144.13,117.56 147.20,111.38 150.27,108.11 153.34,108.80 156.40,113.50 159.47,122.02 162.54,132.29 165.61,141.36 168.67,148.16 171.74,152.67 174.81,155.11 177.88,156.72 180.94,158.77 184.01,161.52 187.08,164.98 190.15,169.08 193.21,173.57 196.28,178.28 199.35,183.17 202.42,188.28 205.48,194.00 208.55,201.14 211.62,210.15 214.69,221.06 217.75,233.66 220.82,245.91 223.89,254.94 226.95,259.71 230.02,260.21 233.09,256.95 236.16,252.54 239.22,249.71 242.29,249.03 245.36,250.49 248.43,253.75 251.49,257.78 254.56,261.80 257.63,265.72 260.70,269.56 263.76,273.85 266.83,279.61 269.90,287.40 272.97,297.25 276.03,308.98 279.10,320.74 282.17,329.97 285.24,335.78 288.30,338.15 291.37,337.34 294.44,334.69 297.51,331.57 300.57,328.27 303.64,324.79 306.71,321.64 309.78,320.38 312.84,322.14 315.91,327.06 318.98,335.08 322.04,344.49 325.11,352.04 328.18,355.98 331.25,356.24 334.31,353.03 337.38,348.39 340.45,345.12 343.52,344.20 346.58,345.64 349.65,349.18 352.72,353.60 355.79,357.65 358.85,361.07 361.92,363.86 364.99,365.93 368.06,366.98 371.12,366.81 374.19,365.38 377.26,362.75 380.33,360.19 383.39,360.08 386.46,363.69 389.53,371.07 392.60,381.97 395.66,394.08 398.73,404.25 401.80,411.40 404.86,415.53 407.93,416.90 411.00,416.84 414.07,416.67 417.13,416.65 420.20,416.77 423.27,416.71 426.34,415.52 429.40,412.49 432.47,407.56 435.54,400.78 438.61,393.14 441.67,386.56 444.74,382.00 447.81,379.51 450.88,379.00 453.94,379.79 457.01,380.92 460.08,382.08 463.15,383.28 466.21,384.40 469.28,384.86 472.35,384.11 475.42,382.04 478.48,378.66 481.55,374.25 484.62,369.59 487.69,365.25 490.75,361.28 493.82,357.71 496.89,354.86 499.95,353.34 503.02,353.47 506.09,355.25 509.16,358.60 512.22,362.72 515.29,366.54 518.36,369.72 521.43,372.24 524.49,374.19 527.56,375.92 530.63,377.78 533.70,379.82 536.76,382.05 539.83,384.56 542.90,387.57 545.97,391.26 549.03,395.65 552.10,400.69 555.17,405.84 558.24,410.08 561.30,412.89 564.37,414.26 567.44,414.27 570.51,413.78 573.57,413.89 576.64,414.96 579.71,416.98 582.78,419.79 585.84,422.69 588.91,424.98 591.98,426.53 595.04,427.34 598.11,427.57 601.18,427.68 604.25,427.97 607.31,428.48 610.38,429.18 613.45,429.66 616.52,429.16 619.58,427.31 622.65,424.10 625.72,419.63 628.79,414.79 631.85,410.73 634.92,407.79 637.99,405.98 641.06,405.21 644.12,405.04 647.19,405.05 650.26,405.17 653.33,405.39 656.39,405.60 659.46,405.46 662.53,404.74 665.60,403.42 668.66,401.51 671.73,399.12 674.80,396.45 677.86,393.59 680.93,390.56 684.00,387.89 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,127.45 76.65,125.09 79.72,122.46 82.79,120.06 85.85,117.91 88.92,116.41 91.99,116.41 95.06,118.37 98.12,122.33 101.19,128.14 104.26,134.23 107.33,138.32 110.39,139.56 113.46,137.95 116.53,133.78 119.60,128.72 122.66,124.53 125.73,121.60 128.80,119.92 131.86,119.63 134.93,121.09 138.00,124.61 141.07,130.21 144.13,137.87 147.20,146.49 150.27,153.88 153.34,158.82 156.40,161.25 159.47,161.25 162.54,159.84 165.61,158.41 168.67,157.50 171.74,157.10 174.81,157.28 177.88,158.39 180.94,160.78 184.01,164.52 187.08,169.61 190.15,175.75 193.21,181.96 196.28,187.51 199.35,192.32 202.42,196.38 205.48,199.90 208.55,203.25 211.62,206.64 214.69,210.08 217.75,213.57 220.82,217.10 223.89,220.65 226.95,224.20 230.02,227.77 233.09,231.37 236.16,235.17 239.22,239.34 242.29,243.91 245.36,248.88 248.43,254.21 251.49,259.78 254.56,265.49 257.63,271.34 260.70,277.33 263.76,283.50 266.83,289.95 269.90,296.73 272.97,303.85 276.03,311.25 279.10,318.57 282.17,325.25 285.24,331.12 288.30,336.16 291.37,340.27 294.44,342.91 297.51,343.54 300.57,342.04 303.64,338.40 306.71,333.28 309.78,328.57 312.84,325.69 315.91,324.79 318.98,325.87 322.04,328.58 325.11,332.26 328.18,336.58 331.25,341.50 334.31,346.99 337.38,352.44 340.45,357.05 343.52,360.54 346.58,362.92 349.65,364.21 352.72,364.63 355.79,364.38 358.85,363.51 361.92,362.01 364.99,360.18 368.06,358.89 371.12,358.78 374.19,359.93 377.26,362.32 380.33,365.75 383.39,369.82 386.46,374.32 389.53,379.25 392.60,384.54 395.66,389.55 398.73,393.41 401.80,395.82 404.86,396.79 407.93,396.48 411.00,395.68 414.07,395.19 417.13,395.17 420.20,395.61 423.27,396.41 426.34,397.22 429.40,397.82 432.47,398.18 435.54,398.29 438.61,398.11 441.67,397.50 444.74,396.43 447.81,394.88 450.88,392.88 453.94,390.61 457.01,388.31 460.08,386.08 463.15,383.91 466.21,381.72 469.28,379.16 472.35,375.87 475.42,371.78 478.48,366.89 481.55,361.54 484.62,356.70 487.69,353.05 490.75,350.65 493.82,349.52 496.89,349.70 499.95,351.30 503.02,354.37 506.09,358.92 509.16,364.85 512.22,371.36 515.29,377.38 518.36,382.57 521.43,386.90 524.49,390.42 527.56,393.24 530.63,395.46 533.70,397.12 536.76,398.20 539.83,398.84 542.90,399.39 545.97,400.13 549.03,401.06 552.10,402.18 555.17,403.39 558.24,404.49 561.30,405.38 564.37,406.06 567.44,406.54 570.51,406.97 573.57,407.53 576.64,408.27 579.71,409.21 582.78,410.34 585.84,411.70 588.91,413.32 591.98,415.21 595.04,417.38 598.11,419.70 601.18,421.85 604.25,423.63 607.31,425.01 610.38,425.97 613.45,426.39 616.52,425.98 619.58,424.63 622.65,422.32 625.72,419.10 628.79,415.35 631.85,411.54 634.92,407.82 637.99,404.19 641.06,400.84 644.12,398.59 647.19,398.22 650.26,399.89 653.33,403.57 656.39,408.85 659.46,414.59 662.53,420.00 665.60,425.00 668.66,429.60 671.73,433.73 674.80,437.29 677.86,440.21 680.93,442.51 684.00,444.00 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,159.66 76.65,156.25 79.72,152.68 82.79,149.72 85.85,147.38 88.92,145.51 91.99,143.86 95.06,142.27 98.12,140.74 101.19,139.26 104.26,137.82 107.33,136.40 110.39,134.97 113.46,133.55 116.53,132.15 119.60,130.85 122.66,129.72 125.73,128.79 128.80,128.06 131.86,127.63 134.93,127.78 138.00,128.74 141.07,130.55 144.13,133.18 147.20,136.03 150.27,137.91 153.34,138.15 156.40,136.71 159.47,133.71 162.54,130.44 165.61,128.73 168.67,129.25 171.74,132.02 174.81,136.95 177.88,143.61 180.94,151.57 184.01,160.72 187.08,171.06 190.15,182.04 193.21,191.97 196.28,199.54 199.35,204.62 202.42,207.22 205.48,208.33 208.55,209.87 211.62,212.90 214.69,217.46 217.75,223.53 220.82,230.79 223.89,238.80 226.95,247.40 230.02,256.58 233.09,266.05 236.16,274.22 239.22,279.45 242.29,281.41 245.36,280.08 248.43,276.15 251.49,271.63 254.56,268.05 257.63,265.58 260.70,264.24 263.76,264.43 266.83,266.93 269.90,272.15 272.97,280.13 276.03,290.68 279.10,301.95 282.17,311.38 285.24,318.05 288.30,321.97 291.37,323.44 294.44,324.11 297.51,325.65 300.57,328.40 303.64,332.36 306.71,337.08 309.78,341.21 312.84,343.73 315.91,344.54 318.98,343.66 322.04,341.61 325.11,339.39 328.18,337.54 331.25,336.09 334.31,335.05 337.38,334.57 340.45,334.86 343.52,335.99 346.58,337.97 349.65,340.64 352.72,343.25 355.79,345.03 358.85,345.84 361.92,345.67 364.99,345.14 368.06,346.01 371.12,349.59 374.19,356.02 377.26,365.25 380.33,376.03 383.39,386.02 386.46,393.97 389.53,399.84 392.60,403.69 395.66,406.11 398.73,407.90 401.80,409.34 404.86,410.43 407.93,411.19 411.00,411.72 414.07,412.10 417.13,412.35 420.20,412.48 423.27,412.46 426.34,412.21 429.40,411.69 432.47,410.88 435.54,409.79 438.61,408.15 441.67,405.50 444.74,401.60 447.81,396.44 450.88,390.09 453.94,383.19 457.01,376.61 460.08,370.64 463.15,365.28 466.21,360.57 469.28,356.66 472.35,353.72 475.42,351.76 478.48,350.81 481.55,350.62 484.62,350.58 487.69,350.24 490.75,349.55 493.82,348.55 496.89,347.90 499.95,348.85 503.02,352.03 506.09,357.46 509.16,365.02 512.22,373.56 515.29,381.55 518.36,388.52 521.43,394.44 524.49,399.36 527.56,403.49 530.63,407.01 533.70,409.98 536.76,412.39 539.83,414.17 542.90,415.16 545.97,415.24 549.03,414.39 552.10,412.65 555.17,410.56 558.24,409.11 561.30,408.80 564.37,409.65 567.44,411.60 570.51,414.20 573.57,416.83 576.64,419.29 579.71,421.59 582.78,423.61 585.84,424.84 588.91,424.77 591.98,423.32 595.04,420.49 598.11,416.76 601.18,413.43 604.25,411.43 607.31,410.83 610.38,411.60 613.45,412.91 616.52,413.29 619.58,412.02 622.65,409.06 625.72,404.60 628.79,400.16 631.85,397.73 634.92,397.94 637.99,400.77 641.06,405.96 644.12,412.17 647.19,418.17 650.26,423.72 653.33,428.84 656.39,433.33 659.46,436.74 662.53,438.74 665.60,439.30 668.66,438.45 671.73,436.90 674.80,435.89 677.86,436.03 680.93,437.33 684.00,439.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,152.96 76.65,151.74 79.72,149.96 82.79,147.80 85.85,145.25 88.92,142.41 91.99,139.49 95.06,136.58 98.12,133.69 101.19,130.88 104.26,128.60 107.33,127.56 110.39,127.99 113.46,129.90 116.53,133.16 119.60,137.05 122.66,140.81 125.73,144.25 128.80,147.39 131.86,149.99 134.93,151.32 138.00,150.80 141.07,148.38 144.13,144.07 147.20,138.64 150.27,133.62 153.34,129.87 156.40,127.42 159.47,126.31 162.54,126.94 165.61,129.83 168.67,135.21 171.74,143.07 174.81,153.02 177.88,162.96 180.94,170.72 184.01,175.80 187.08,178.23 190.15,178.58 193.21,178.69 196.28,179.96 199.35,182.54 202.42,186.43 205.48,191.53 208.55,197.64 211.62,204.65 214.69,212.57 217.75,221.33 220.82,230.33 223.89,238.76 226.95,246.31 230.02,252.97 233.09,258.69 236.16,263.08 239.22,265.76 242.29,266.66 245.36,265.78 248.43,263.43 251.49,260.57 254.56,257.94 257.63,255.61 260.70,253.62 263.76,252.71 266.83,254.34 269.90,259.32 272.97,267.67 276.03,279.19 279.10,291.81 282.17,302.62 285.24,310.60 288.30,315.74 291.37,318.28 294.44,319.41 297.51,320.34 300.57,321.33 303.64,322.37 306.71,323.55 309.78,325.10 312.84,327.19 315.91,329.84 318.98,333.03 322.04,336.24 325.11,338.44 328.18,339.10 331.25,338.19 334.31,335.86 337.38,333.60 340.45,333.45 343.52,336.13 346.58,341.63 349.65,349.60 352.72,358.23 355.79,365.68 358.85,371.60 361.92,375.98 364.99,378.94 368.06,380.86 371.12,381.99 374.19,382.36 377.26,382.00 380.33,381.35 383.39,381.30 386.46,382.28 389.53,384.33 392.60,387.42 395.66,391.38 398.73,396.01 401.80,401.21 404.86,406.99 407.93,413.13 411.00,418.46 414.07,421.87 417.13,423.13 420.20,422.24 423.27,419.79 426.34,417.48 429.40,416.55 432.47,417.13 435.54,419.17 438.61,421.61 441.67,422.45 444.74,420.67 447.81,416.22 450.88,409.21 453.94,400.76 457.01,392.35 460.08,384.45 463.15,377.08 466.21,370.24 469.28,363.91 472.35,358.08 475.42,352.74 478.48,347.90 481.55,343.63 484.62,340.10 487.69,337.46 490.75,335.72 493.82,334.87 496.89,334.75 499.95,335.06 503.02,335.65 506.09,336.51 509.16,337.69 512.22,339.67 515.29,343.05 518.36,348.05 521.43,354.66 524.49,362.69 527.56,371.18 530.63,379.21 533.70,386.62 536.76,393.39 539.83,399.54 542.90,405.06 545.97,409.95 549.03,414.21 552.10,417.84 555.17,420.88 558.24,423.42 561.30,425.50 564.37,427.11 567.44,428.33 570.51,429.73 573.57,432.08 576.64,435.63 579.71,440.37 582.78,446.07 585.84,451.66 588.91,456.09 591.98,459.16 595.04,460.89 598.11,461.19 601.18,459.87 604.25,456.77 607.31,451.90 610.38,445.26 613.45,437.41 616.52,429.28 619.58,421.37 622.65,413.68 625.72,406.23 628.79,399.24 631.85,392.95 634.92,387.45 637.99,382.74 641.06,378.81 644.12,375.67 647.19,373.31 650.26,371.72 653.33,370.91 656.39,370.74 659.46,370.86 662.53,371.03 665.60,371.23 668.66,371.45 671.73,371.52 674.80,371.14 677.86,370.15 680.93,368.55 684.00,366.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,81.93 76.65,89.25 79.72,97.79 82.79,106.11 85.85,114.21 88.92,121.88 91.99,128.70 95.06,134.42 98.12,139.03 101.19,142.56 104.26,145.30 107.33,147.67 110.39,149.81 113.46,151.74 116.53,153.34 119.60,154.00 122.66,153.09 125.73,150.46 128.80,146.12 131.86,140.57 134.93,135.40 138.00,131.87 141.07,130.10 144.13,130.10 147.20,131.68 150.27,134.45 153.34,138.23 156.40,142.98 159.47,148.63 162.54,154.20 165.61,158.31 168.67,160.46 171.74,160.64 174.81,159.19 177.88,157.89 180.94,158.61 184.01,161.75 187.08,167.32 190.15,174.79 193.21,182.55 196.28,189.37 199.35,195.10 202.42,199.76 205.48,203.65 208.55,207.38 211.62,211.28 214.69,215.37 217.75,219.64 220.82,223.89 223.89,227.89 226.95,231.54 230.02,234.84 233.09,237.84 236.16,240.83 239.22,244.09 242.29,247.70 245.36,251.64 248.43,255.68 251.49,259.07 254.56,261.25 257.63,262.16 260.70,261.82 263.76,261.14 266.83,261.85 269.90,264.89 272.97,270.32 276.03,278.04 279.10,287.21 282.17,296.65 285.24,305.94 288.30,315.07 291.37,323.93 294.44,331.87 297.51,338.23 300.57,342.87 303.64,345.81 306.71,347.31 309.78,348.21 312.84,349.12 315.91,350.13 318.98,351.22 322.04,352.46 325.11,353.98 328.18,355.84 331.25,358.03 334.31,360.49 337.38,362.49 340.45,363.01 343.52,361.72 346.58,358.61 349.65,353.97 352.72,349.19 355.79,345.71 358.85,343.81 361.92,343.50 364.99,344.62 368.06,346.74 371.12,349.54 374.19,352.99 377.26,357.07 380.33,361.38 383.39,365.16 386.46,368.01 389.53,369.91 392.60,370.99 395.66,372.47 398.73,376.02 401.80,382.20 404.86,391.01 407.93,401.90 411.00,412.15 414.07,419.03 417.13,422.01 420.20,421.09 423.27,416.88 426.34,411.11 429.40,405.03 432.47,398.79 435.54,392.39 438.61,386.34 441.67,381.57 444.74,378.58 447.81,377.37 450.88,377.87 453.94,379.24 457.01,380.37 460.08,380.90 463.15,380.81 466.21,380.28 469.28,380.13 472.35,381.16 475.42,383.54 478.48,387.25 481.55,391.82 484.62,395.89 487.69,398.51 490.75,399.57 493.82,399.11 496.89,397.66 499.95,396.27 503.02,395.44 506.09,395.22 509.16,395.54 512.22,396.08 515.29,396.38 518.36,396.30 521.43,395.84 524.49,395.10 527.56,394.63 530.63,394.96 533.70,396.18 536.76,398.29 539.83,401.07 542.90,403.92 545.97,406.41 549.03,408.49 552.10,410.16 555.17,411.33 558.24,411.83 561.30,411.57 564.37,410.54 567.44,408.82 570.51,406.99 573.57,405.83 576.64,405.58 579.71,406.25 582.78,407.63 585.84,408.78 588.91,408.79 591.98,407.50 595.04,404.90 598.11,401.43 601.18,398.23 604.25,396.12 607.31,395.18 610.38,395.40 613.45,396.72 616.52,399.05 619.58,402.33 622.65,406.56 625.72,411.64 628.79,416.70 631.85,420.64 634.92,423.11 637.99,424.09 641.06,423.76 644.12,422.87 647.19,422.15 650.26,421.73 653.33,421.60 656.39,421.72 659.46,421.96 662.53,422.25 665.60,422.58 668.66,422.95 671.73,423.56 674.80,424.77 677.86,426.74 680.93,429.49 684.00,432.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,110.19 76.65,114.06 79.72,118.60 82.79,123.06 85.85,127.43 88.92,131.44 91.99,134.52 95.06,136.37 98.12,136.96 101.19,136.38 104.26,135.62 107.33,136.06 110.39,138.23 113.46,142.15 116.53,147.53 119.60,152.92 122.66,156.73 125.73,158.64 128.80,158.64 131.86,156.97 134.93,154.40 138.00,151.50 141.07,148.36 144.13,144.97 147.20,141.51 150.27,138.33 153.34,135.61 156.40,133.37 159.47,131.60 162.54,130.30 165.61,129.47 168.67,129.08 171.74,129.16 174.81,129.89 177.88,132.31 180.94,137.50 184.01,145.72 187.08,156.94 190.15,170.32 193.21,183.20 196.28,193.55 199.35,201.12 202.42,205.96 205.48,208.65 208.55,210.38 211.62,211.79 214.69,212.93 217.75,213.83 220.82,214.98 223.89,217.07 226.95,220.33 230.02,224.78 233.09,230.28 236.16,236.22 239.22,241.93 242.29,247.28 245.36,252.26 248.43,256.89 251.49,261.15 254.56,265.05 257.63,268.60 260.70,271.80 263.76,275.06 266.83,279.18 269.90,284.60 272.97,291.32 276.03,299.28 279.10,307.70 282.17,315.52 285.24,322.36 288.30,328.21 291.37,333.02 294.44,336.48 297.51,338.30 300.57,338.39 303.64,336.78 306.71,333.93 309.78,331.25 312.84,329.81 315.91,329.71 318.98,330.95 322.04,333.17 325.11,335.67 328.18,338.09 331.25,340.42 334.31,342.65 337.38,344.69 340.45,346.41 343.52,347.77 346.58,348.78 349.65,349.53 352.72,350.58 355.79,352.48 358.85,355.35 361.92,359.17 364.99,363.61 368.06,367.66 371.12,370.56 374.19,372.23 377.26,372.73 380.33,372.98 383.39,374.81 386.46,379.17 389.53,386.08 392.60,395.37 395.66,405.41 398.73,413.96 401.80,420.26 404.86,424.30 407.93,426.26 411.00,427.04 414.07,427.54 417.13,427.94 420.20,428.23 423.27,428.22 426.34,427.40 429.40,425.39 432.47,422.15 435.54,417.67 438.61,412.15 441.67,405.92 444.74,399.16 447.81,391.87 450.88,384.07 453.94,375.88 457.01,367.50 460.08,358.99 463.15,350.33 466.21,341.71 469.28,333.89 472.35,327.65 475.42,323.14 478.48,320.37 481.55,319.34 484.62,320.16 487.69,322.85 490.75,327.45 493.82,333.91 496.89,341.70 499.95,349.81 503.02,357.74 506.09,365.46 509.16,372.91 512.22,379.45 515.29,384.28 518.36,387.10 521.43,387.92 524.49,387.05 527.56,385.95 530.63,386.02 533.70,387.55 536.76,390.51 539.83,394.50 542.90,398.38 545.97,401.32 549.03,403.27 552.10,404.23 555.17,404.62 558.24,405.23 561.30,406.43 564.37,408.25 567.44,410.67 570.51,413.67 573.57,417.20 576.64,421.24 579.71,425.80 582.78,430.73 585.84,435.37 588.91,439.09 591.98,441.78 595.04,443.44 598.11,444.12 601.18,444.01 604.25,443.22 607.31,441.76 610.38,439.63 613.45,436.92 616.52,433.77 619.58,430.25 622.65,426.36 625.72,422.16 628.79,418.11 631.85,414.82 634.92,412.47 637.99,411.07 641.06,410.38 644.12,409.28 647.19,406.74 650.26,402.55 653.33,396.73 656.39,389.82 659.46,383.27 662.53,378.10 665.60,374.40 668.66,372.16 671.73,371.23 674.80,371.35 677.86,372.39 680.93,374.34 684.00,376.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,164.30 76.65,160.44 79.72,155.05 82.79,148.70 85.85,141.41 88.92,133.81 91.99,127.21 95.06,122.33 98.12,119.22 101.19,117.87 104.26,118.21 107.33,120.16 110.39,123.68 113.46,128.77 116.53,135.17 119.60,141.49 122.66,146.24 125.73,149.10 128.80,150.06 131.86,149.53 134.93,148.76 138.00,148.72 141.07,149.53 144.13,151.17 147.20,153.18 150.27,154.60 153.34,154.92 156.40,154.11 159.47,152.25 162.54,150.22 165.61,149.25 168.67,149.82 171.74,151.93 174.81,155.32 177.88,158.69 180.94,160.66 184.01,160.92 187.08,159.48 190.15,156.85 193.21,154.60 196.28,153.93 199.35,154.98 202.42,157.76 205.48,162.66 208.55,170.48 211.62,181.64 214.69,196.17 217.75,213.83 220.82,232.11 223.89,247.49 226.95,258.72 230.02,265.77 233.09,269.00 236.16,270.35 239.22,271.80 242.29,273.76 245.36,276.24 248.43,278.88 251.49,280.65 254.56,280.73 257.63,279.05 260.70,275.65 263.76,271.81 266.83,270.01 269.90,271.61 272.97,276.67 276.03,285.00 279.10,294.77 282.17,303.42 285.24,310.04 288.30,314.63 291.37,317.42 294.44,319.59 297.51,322.36 300.57,325.97 303.64,330.43 306.71,335.29 309.78,339.23 312.84,341.29 315.91,341.34 318.98,339.42 322.04,336.40 325.11,333.96 328.18,332.98 331.25,333.51 334.31,335.49 337.38,338.35 340.45,341.30 343.52,344.07 346.58,346.67 349.65,349.12 352.72,351.64 355.79,354.44 358.85,357.55 361.92,360.98 364.99,364.64 368.06,368.30 371.12,371.76 374.19,375.01 377.26,378.05 380.33,380.86 383.39,383.37 386.46,385.56 389.53,387.44 392.60,389.04 395.66,390.85 398.73,393.52 401.80,397.27 404.86,402.11 407.93,407.75 411.00,412.73 414.07,415.64 417.13,416.18 420.20,414.36 423.27,410.74 426.34,406.94 429.40,404.11 432.47,402.38 435.54,401.72 438.61,401.73 441.67,401.60 444.74,400.92 447.81,399.69 450.88,397.88 453.94,395.42 457.01,392.19 460.08,388.16 463.15,383.32 466.21,377.81 469.28,372.25 472.35,367.24 475.42,362.91 478.48,359.26 481.55,356.24 484.62,353.73 487.69,351.64 490.75,349.96 493.82,348.69 496.89,347.89 499.95,347.68 503.02,348.11 506.09,349.19 509.16,350.87 512.22,352.82 515.29,354.59 518.36,356.03 521.43,357.13 524.49,358.03 527.56,359.32 530.63,361.58 533.70,364.92 536.76,369.34 539.83,374.83 542.90,381.43 545.97,389.13 549.03,397.95 552.10,407.82 555.17,417.67 558.24,425.52 561.30,430.36 564.37,432.17 567.44,431.12 570.51,428.80 573.57,427.26 576.64,427.18 579.71,428.56 582.78,431.18 585.84,434.12 588.91,436.45 591.98,438.01 595.04,438.81 598.11,438.81 601.18,437.94 604.25,436.15 607.31,433.45 610.38,429.83 613.45,425.61 616.52,421.33 619.58,417.25 622.65,413.39 625.72,409.71 628.79,406.03 631.85,402.08 634.92,397.78 637.99,393.12 641.06,388.19 644.12,383.29 647.19,378.73 650.26,374.55 653.33,370.76 656.39,367.22 659.46,363.54 662.53,359.48 665.60,355.01 668.66,350.16 671.73,345.61 674.80,342.56 677.86,341.59 680.93,342.72 684.00,345.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,159.50 76.65,157.07 79.72,153.63 82.79,149.53 85.85,144.78 88.92,139.73 91.99,135.12 95.06,131.36 98.12,128.47 101.19,126.45 104.26,125.33 107.33,125.13 110.39,125.87 113.46,127.55 116.53,129.97 119.60,132.06 122.66,132.67 125.73,131.56 128.80,128.73 131.86,124.87 134.93,122.14 138.00,122.23 141.07,125.34 144.13,131.41 147.20,139.26 150.27,146.44 153.34,151.61 156.40,154.70 159.47,155.82 162.54,156.23 165.61,157.69 168.67,160.85 171.74,165.73 174.81,172.16 177.88,179.30 180.94,186.30 184.01,192.96 187.08,199.27 190.15,204.81 193.21,208.29 196.28,208.70 199.35,205.94 202.42,200.05 205.48,192.74 208.55,187.43 211.62,185.96 214.69,188.43 217.75,194.68 220.82,203.07 223.89,211.28 226.95,218.49 230.02,224.69 233.09,229.98 236.16,234.89 239.22,239.97 242.29,245.32 245.36,250.96 248.43,256.84 251.49,262.84 254.56,268.88 257.63,274.93 260.70,280.99 263.76,286.96 266.83,292.62 269.90,297.84 272.97,302.61 276.03,306.93 279.10,310.56 282.17,313.22 285.24,314.80 288.30,315.29 291.37,314.82 294.44,314.00 297.51,313.46 300.57,313.34 303.64,313.62 306.71,314.39 309.78,315.86 312.84,318.18 315.91,321.38 318.98,325.44 322.04,329.96 325.11,334.17 328.18,337.65 331.25,340.40 334.31,342.41 337.38,343.66 340.45,344.14 343.52,343.85 346.58,342.78 349.65,341.27 352.72,341.02 355.79,343.74 358.85,349.79 361.92,359.15 364.99,370.70 368.06,381.16 371.12,388.09 374.19,391.25 377.26,390.70 380.33,387.94 383.39,385.87 386.46,385.97 389.53,388.32 392.60,392.80 395.66,398.18 398.73,402.83 401.80,406.19 404.86,408.26 407.93,409.10 411.00,409.05 414.07,408.43 417.13,407.31 420.20,405.69 423.27,403.82 426.34,402.44 429.40,402.09 432.47,402.82 435.54,404.60 438.61,406.74 441.67,407.94 444.74,407.52 447.81,405.45 450.88,401.80 453.94,396.97 457.01,391.56 460.08,385.74 463.15,379.52 466.21,373.13 469.28,367.67 472.35,364.22 475.42,362.99 478.48,363.98 481.55,366.65 484.62,369.48 487.69,371.38 490.75,372.24 493.82,372.10 496.89,371.62 499.95,372.06 503.02,374.07 506.09,377.65 509.16,382.66 512.22,387.59 515.29,390.49 518.36,390.71 521.43,388.24 524.49,383.50 527.56,378.44 530.63,374.94 533.70,373.38 536.76,373.74 539.83,375.68 542.90,378.28 545.97,380.86 549.03,383.36 552.10,385.79 555.17,388.44 558.24,391.81 561.30,396.18 564.37,401.53 567.44,407.80 570.51,414.17 573.57,419.60 576.64,423.76 579.71,426.65 582.78,428.25 585.84,428.55 588.91,427.52 591.98,425.15 595.04,421.46 598.11,416.87 601.18,412.55 604.25,409.32 607.31,407.27 610.38,406.38 613.45,406.30 616.52,406.42 619.58,406.46 622.65,406.38 625.72,406.19 628.79,405.70 631.85,404.72 634.92,403.16 637.99,401.04 641.06,398.42 644.12,395.61 647.19,392.91 650.26,390.37 653.33,387.99 656.39,385.89 659.46,384.36 662.53,383.59 665.60,383.61 668.66,384.40 671.73,385.63 674.80,386.71 677.86,387.36 680.93,387.57 684.00,387.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,121.29 76.65,121.35 79.72,121.13 82.79,120.54 85.85,119.62 88.92,118.96 91.99,119.83 95.06,122.95 98.12,128.33 101.19,135.84 104.26,143.67 107.33,149.25 110.39,151.63 113.46,150.80 116.53,147.04 119.60,142.03 122.66,137.54 125.73,133.94 128.80,131.25 131.86,129.49 134.93,128.79 138.00,129.25 141.07,130.88 144.13,133.66 147.20,137.20 150.27,140.65 153.34,143.58 156.40,145.96 159.47,147.83 162.54,149.59 165.61,151.84 168.67,154.79 171.74,158.44 174.81,162.75 177.88,167.50 180.94,172.46 184.01,177.57 187.08,182.85 190.15,188.14 193.21,192.98 196.28,197.05 199.35,200.29 202.42,202.72 205.48,204.38 208.55,205.38 211.62,205.80 214.69,205.63 217.75,204.97 220.82,204.84 223.89,206.69 226.95,211.03 230.02,217.87 233.09,226.81 236.16,235.67 239.22,242.22 242.29,246.00 245.36,247.01 248.43,246.06 251.49,245.59 254.56,247.47 257.63,251.91 260.70,258.88 263.76,267.74 266.83,277.25 269.90,286.71 272.97,296.12 276.03,305.39 279.10,313.80 282.17,320.38 285.24,324.76 288.30,326.95 291.37,327.27 294.44,327.43 297.51,329.16 300.57,332.84 303.64,338.46 306.71,345.24 309.78,350.90 312.84,353.74 315.91,353.57 318.98,350.43 322.04,345.64 325.11,341.71 328.18,339.98 331.25,340.51 334.31,343.18 337.38,346.93 340.45,350.29 343.52,352.74 346.58,354.28 349.65,355.02 352.72,355.46 355.79,356.14 358.85,357.16 361.92,358.51 364.99,360.11 368.06,361.72 371.12,363.15 374.19,364.38 377.26,365.43 380.33,366.88 383.39,369.83 386.46,374.84 389.53,381.96 392.60,391.01 395.66,400.46 398.73,408.24 401.80,413.63 404.86,416.63 407.93,417.38 411.00,416.59 414.07,414.98 417.13,412.68 420.20,409.69 423.27,406.31 426.34,403.34 429.40,401.38 432.47,400.50 435.54,400.66 438.61,401.02 441.67,399.99 444.74,396.78 447.81,391.33 450.88,383.81 453.94,375.64 457.01,368.73 460.08,363.72 463.15,360.62 466.21,359.34 469.28,359.56 472.35,360.92 475.42,363.37 478.48,366.89 481.55,371.24 484.62,375.74 487.69,379.87 490.75,383.58 493.82,386.87 496.89,389.53 499.95,391.14 503.02,391.50 506.09,390.61 509.16,388.50 512.22,385.45 515.29,381.85 518.36,377.82 521.43,373.35 524.49,368.74 527.56,365.27 530.63,364.22 533.70,365.82 536.76,370.07 539.83,376.54 542.90,384.08 545.97,391.86 549.03,399.80 552.10,407.87 555.17,415.42 558.24,421.23 561.30,424.71 564.37,425.83 567.44,424.72 570.51,422.43 573.57,420.35 576.64,418.91 579.71,418.11 582.78,417.95 585.84,418.31 588.91,419.10 591.98,420.32 595.04,421.95 598.11,423.84 601.18,425.58 604.25,426.89 607.31,427.73 610.38,428.11 613.45,427.93 616.52,427.08 619.58,425.46 622.65,423.08 625.72,419.97 628.79,416.35 631.85,412.50 634.92,408.52 637.99,404.40 641.06,400.22 644.12,396.31 647.19,392.99 650.26,390.31 653.33,388.27 656.39,386.58 659.46,384.48 662.53,381.43 665.60,377.37 668.66,372.34 671.73,366.62 674.80,360.77 677.86,355.06 680.93,349.48 684.00,344.89 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,192.90 76.65,192.79 79.72,190.56 82.79,185.74 85.85,178.36 88.92,169.11 91.99,159.44 95.06,150.15 98.12,141.29 101.19,132.93 104.26,125.92 107.33,121.53 110.39,120.19 113.46,121.93 116.53,126.42 119.60,131.84 122.66,136.32 125.73,139.41 128.80,141.13 131.86,141.65 134.93,141.57 138.00,141.35 141.07,141.02 144.13,140.61 147.20,140.44 150.27,141.20 153.34,143.26 156.40,146.64 159.47,151.25 162.54,156.09 165.61,159.75 168.67,161.72 171.74,161.99 174.81,160.87 177.88,159.98 180.94,161.02 184.01,164.37 187.08,170.02 190.15,177.71 193.21,186.62 196.28,196.12 199.35,206.14 202.42,216.64 205.48,226.32 208.55,232.60 211.62,234.07 214.69,230.66 217.75,222.65 220.82,212.84 223.89,205.19 226.95,201.13 230.02,200.68 233.09,203.54 236.16,208.17 239.22,212.98 242.29,217.64 245.36,222.15 248.43,226.77 251.49,232.34 254.56,239.46 257.63,248.21 260.70,258.57 263.76,269.85 266.83,280.72 269.90,290.45 272.97,299.01 276.03,306.40 279.10,312.49 282.17,317.13 285.24,320.26 288.30,321.88 291.37,322.19 294.44,322.26 297.51,323.16 300.57,325.13 303.64,328.14 306.71,331.96 309.78,335.80 312.84,339.08 315.91,341.75 318.98,343.79 322.04,345.01 325.11,345.07 328.18,343.77 331.25,341.10 334.31,337.19 337.38,333.47 340.45,331.86 343.52,333.02 346.58,336.97 349.65,343.34 352.72,350.29 355.79,355.95 358.85,359.96 361.92,362.32 364.99,363.55 368.06,365.23 371.12,368.50 374.19,373.48 377.26,380.14 380.33,387.85 383.39,395.37 386.46,402.09 389.53,407.95 392.60,412.99 395.66,417.34 398.73,421.19 401.80,424.59 404.86,427.56 407.93,430.04 411.00,431.80 414.07,432.62 417.13,432.45 420.20,431.28 423.27,429.07 426.34,425.63 429.40,420.85 432.47,414.72 435.54,407.24 438.61,398.71 441.67,389.68 444.74,380.42 447.81,370.95 450.88,361.39 453.94,352.89 457.01,346.99 460.08,344.20 463.15,344.52 466.21,347.51 469.28,351.00 472.35,352.87 475.42,352.71 478.48,350.52 481.55,347.05 484.62,344.45 487.69,344.23 490.75,346.56 493.82,351.38 496.89,357.64 499.95,363.40 503.02,367.65 506.09,370.37 509.16,371.64 512.22,372.15 515.29,372.87 518.36,374.08 521.43,375.80 524.49,378.06 527.56,380.94 530.63,384.58 533.70,388.97 536.76,394.12 539.83,399.64 542.90,404.47 545.97,407.84 549.03,409.69 552.10,410.05 555.17,409.88 558.24,410.95 561.30,414.12 564.37,419.42 567.44,426.67 570.51,434.11 573.57,439.47 576.64,442.01 579.71,441.74 582.78,439.04 585.84,435.82 588.91,433.87 591.98,433.53 595.04,434.79 598.11,437.11 601.18,438.96 604.25,439.32 607.31,438.06 610.38,435.23 613.45,431.46 616.52,427.87 619.58,425.02 622.65,422.94 625.72,421.61 628.79,420.88 631.85,420.57 634.92,420.60 637.99,420.99 641.06,421.54 644.12,421.42 647.19,419.81 650.26,416.59 653.33,411.76 656.39,405.76 659.46,399.81 662.53,394.75 665.60,390.65 668.66,387.52 671.73,385.34 674.80,384.09 677.86,383.75 680.93,384.33 684.00,385.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,150.93 76.65,152.12 79.72,153.05 82.79,153.38 85.85,153.11 88.92,152.27 91.99,150.94 95.06,149.16 98.12,146.93 101.19,144.29 104.26,141.79 107.33,140.19 110.39,139.77 113.46,140.54 116.53,142.40 119.60,144.72 122.66,146.86 125.73,148.67 128.80,150.16 131.86,151.17 134.93,151.23 138.00,149.95 141.07,147.29 144.13,143.29 147.20,138.94 150.27,136.24 153.34,136.29 156.40,139.16 159.47,144.69 162.54,151.26 165.61,156.58 168.67,159.79 171.74,160.89 174.81,160.15 177.88,159.06 180.94,159.16 184.01,160.79 187.08,163.94 190.15,168.28 193.21,172.78 196.28,176.66 199.35,179.81 202.42,182.27 205.48,184.51 208.55,187.51 211.62,191.79 214.69,197.40 217.75,204.30 220.82,212.34 223.89,221.28 226.95,231.04 230.02,241.61 233.09,252.68 236.16,262.60 239.22,269.65 242.29,273.49 245.36,274.11 248.43,272.03 251.49,268.80 254.56,265.62 257.63,262.61 260.70,259.81 263.76,257.91 266.83,258.30 269.90,261.73 272.97,268.24 276.03,277.70 279.10,288.95 282.17,300.36 285.24,311.36 288.30,321.94 291.37,331.99 294.44,340.97 297.51,348.32 300.57,353.92 303.64,357.78 306.71,360.18 309.78,361.93 312.84,363.68 315.91,365.47 318.98,367.29 322.04,368.71 325.11,368.88 328.18,367.35 331.25,364.08 334.31,359.18 337.38,353.37 340.45,347.69 343.52,342.49 346.58,337.78 349.65,333.72 352.72,331.12 355.79,330.81 358.85,332.95 361.92,337.53 364.99,344.04 368.06,350.97 371.12,357.22 374.19,362.66 377.26,367.30 380.33,371.29 383.39,374.88 386.46,378.24 389.53,381.35 392.60,384.25 395.66,387.07 398.73,390.05 401.80,393.24 404.86,396.65 407.93,400.19 411.00,403.39 414.07,405.79 417.13,407.31 420.20,407.95 423.27,407.88 426.34,407.64 429.40,407.60 432.47,407.81 435.54,408.24 438.61,408.58 441.67,408.21 444.74,406.80 447.81,404.35 450.88,400.90 453.94,396.76 457.01,392.39 460.08,387.94 463.15,383.41 466.21,378.79 469.28,374.06 472.35,369.22 475.42,364.27 478.48,359.19 481.55,354.30 484.62,350.43 487.69,348.18 490.75,347.62 493.82,348.73 496.89,351.21 499.95,354.50 503.02,358.30 506.09,362.61 509.16,367.38 512.22,372.09 515.29,376.09 518.36,379.14 521.43,381.26 524.49,382.49 527.56,383.06 530.63,383.20 533.70,382.95 536.76,382.32 539.83,381.63 542.90,381.77 545.97,383.39 549.03,386.54 552.10,391.19 555.17,396.70 558.24,401.88 561.30,406.15 564.37,409.48 567.44,411.91 570.51,413.73 573.57,415.32 576.64,416.80 579.71,418.17 582.78,419.42 585.84,420.49 588.91,421.32 591.98,421.91 595.04,422.24 598.11,422.51 601.18,423.21 604.25,424.67 607.31,426.94 610.38,429.98 613.45,433.22 616.52,435.60 619.58,436.61 622.65,436.23 625.72,434.53 628.79,432.16 631.85,429.96 634.92,428.18 637.99,426.83 641.06,425.75 644.12,424.30 647.19,421.83 650.26,418.24 653.33,413.53 656.39,407.98 659.46,402.35 662.53,397.18 665.60,392.50 668.66,388.29 671.73,384.09 674.80,379.08 677.86,372.83 680.93,365.35 684.00,358.23 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,127.80 76.65,133.24 79.72,137.48 82.79,138.96 85.85,137.72 88.92,134.58 91.99,131.28 95.06,128.78 98.12,127.12 101.19,126.33 104.26,126.42 107.33,127.47 110.39,129.49 113.46,132.48 116.53,136.29 119.60,140.00 122.66,142.66 125.73,144.07 128.80,144.22 131.86,143.32 134.93,142.05 138.00,140.92 141.07,139.99 144.13,139.26 147.20,138.91 150.27,139.25 153.34,140.46 156.40,142.56 159.47,145.49 162.54,148.72 165.61,151.46 168.67,153.43 171.74,154.64 174.81,155.10 177.88,155.04 180.94,154.64 184.01,153.96 187.08,153.01 190.15,152.26 193.21,153.25 196.28,157.15 199.35,164.07 202.42,174.00 205.48,186.02 208.55,198.30 211.62,209.85 214.69,220.63 217.75,230.57 220.82,238.95 223.89,244.78 226.95,247.70 230.02,247.70 233.09,245.19 236.16,242.28 239.22,241.14 242.29,242.25 245.36,245.60 248.43,250.90 251.49,257.24 254.56,263.95 257.63,270.94 260.70,278.22 263.76,285.51 266.83,292.30 269.90,298.29 272.97,303.48 276.03,307.88 279.10,311.47 282.17,314.28 285.24,316.29 288.30,317.52 291.37,318.18 294.44,319.42 297.51,322.39 300.57,327.34 303.64,334.26 306.71,342.25 309.78,348.59 312.84,351.26 315.91,350.03 318.98,344.97 322.04,337.63 325.11,331.03 328.18,326.74 331.25,324.85 334.31,325.31 337.38,327.56 340.45,330.87 343.52,334.99 346.58,339.91 349.65,345.54 352.72,351.35 355.79,356.84 358.85,361.90 361.92,366.54 364.99,370.63 368.06,373.83 371.12,375.89 374.19,376.76 377.26,376.50 380.33,375.91 383.39,376.57 386.46,379.28 389.53,384.09 392.60,390.89 395.66,398.72 398.73,406.29 401.80,413.16 404.86,419.31 407.93,424.60 411.00,428.19 414.07,429.29 417.13,427.72 420.20,423.51 423.27,417.19 426.34,410.32 429.40,404.03 432.47,398.46 435.54,393.59 438.61,389.46 441.67,386.14 444.74,383.68 447.81,382.06 450.88,381.21 453.94,380.35 457.01,378.44 460.08,375.12 463.15,370.40 466.21,364.44 469.28,358.01 472.35,351.89 475.42,346.21 478.48,340.99 481.55,336.45 484.62,333.25 487.69,331.84 490.75,332.28 493.82,334.56 496.89,338.44 499.95,343.50 503.02,349.52 506.09,356.48 509.16,364.34 512.22,372.65 515.29,380.82 518.36,388.64 521.43,396.11 524.49,403.13 527.56,409.16 530.63,413.65 533.70,416.53 536.76,417.79 539.83,417.76 542.90,417.37 545.97,417.28 549.03,417.55 552.10,418.17 555.17,419.04 558.24,419.97 561.30,420.86 564.37,421.72 567.44,422.52 570.51,423.18 573.57,423.56 576.64,423.62 579.71,423.35 582.78,422.78 585.84,422.01 588.91,421.11 591.98,420.11 595.04,419.01 598.11,417.81 601.18,416.53 604.25,415.19 607.31,413.79 610.38,412.34 613.45,411.10 616.52,410.55 619.58,410.92 622.65,412.22 625.72,414.36 628.79,416.65 631.85,418.18 634.92,418.67 637.99,418.12 641.06,416.63 644.12,414.69 647.19,412.75 650.26,410.89 653.33,409.11 656.39,407.51 659.46,406.33 662.53,405.73 665.60,405.73 668.66,406.32 671.73,407.25 674.80,408.05 677.86,408.51 680.93,408.62 684.00,408.47 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,88.56 76.65,91.11 79.72,94.39 82.79,97.97 85.85,101.84 88.92,105.98 91.99,110.34 95.06,114.88 98.12,119.61 101.19,124.51 104.26,129.42 107.33,134.10 110.39,138.47 113.46,142.53 116.53,146.08 119.60,148.06 122.66,147.35 125.73,143.70 128.80,137.13 131.86,128.58 134.93,121.11 138.00,117.10 141.07,116.80 144.13,120.18 147.20,126.18 150.27,132.62 153.34,138.30 156.40,143.15 159.47,147.25 162.54,151.30 165.61,156.31 168.67,162.64 171.74,170.31 174.81,179.02 177.88,187.21 180.94,193.26 184.01,196.81 187.08,197.88 190.15,197.02 193.21,196.04 196.28,196.31 199.35,197.99 202.42,201.05 205.48,205.13 208.55,209.47 211.62,213.65 214.69,217.66 217.75,221.53 220.82,225.58 223.89,230.24 226.95,235.69 230.02,241.92 233.09,248.66 236.16,254.47 239.22,257.85 242.29,258.49 245.36,256.41 248.43,252.37 251.49,248.75 254.56,247.36 257.63,248.38 260.70,251.79 263.76,256.85 266.83,262.12 269.90,266.82 272.97,270.92 276.03,274.49 279.10,278.36 282.17,283.70 285.24,290.90 288.30,299.97 291.37,310.59 294.44,321.11 297.51,329.85 300.57,336.47 303.64,340.96 306.71,343.68 309.78,345.72 312.84,347.86 315.91,350.19 318.98,352.71 322.04,355.16 325.11,357.05 328.18,358.11 331.25,358.34 334.31,357.76 337.38,356.61 340.45,355.21 343.52,353.68 346.58,352.02 349.65,350.27 352.72,348.68 355.79,347.47 358.85,346.69 361.92,346.35 364.99,346.47 368.06,347.19 371.12,348.57 374.19,350.64 377.26,353.39 380.33,356.77 383.39,360.67 386.46,365.06 389.53,369.93 392.60,375.26 395.66,380.87 398.73,386.52 401.80,392.13 404.86,397.71 407.93,403.16 411.00,408.04 414.07,411.92 417.13,414.71 420.20,416.42 423.27,416.92 426.34,415.86 429.40,412.98 432.47,408.27 435.54,401.76 438.61,394.45 441.67,388.23 444.74,384.08 447.81,382.04 450.88,381.96 453.94,382.59 457.01,382.23 460.08,380.32 463.15,376.85 466.21,372.12 469.28,367.62 472.35,364.80 475.42,363.92 478.48,365.00 481.55,367.57 484.62,370.39 487.69,372.55 490.75,373.95 493.82,374.62 496.89,375.07 499.95,376.23 503.02,378.57 506.09,382.11 509.16,386.76 512.22,391.61 515.29,395.48 518.36,397.97 521.43,399.08 524.49,398.94 527.56,398.22 530.63,397.53 533.70,397.01 536.76,396.64 539.83,396.46 542.90,396.52 545.97,396.88 549.03,397.54 552.10,398.52 555.17,400.02 558.24,402.45 561.30,406.00 564.37,410.69 567.44,416.41 570.51,422.33 573.57,427.35 576.64,431.13 579.71,433.65 582.78,434.97 585.84,435.29 588.91,434.84 591.98,433.64 595.04,431.69 598.11,429.12 601.18,426.27 604.25,423.36 607.31,420.43 610.38,417.46 613.45,414.32 616.52,410.78 619.58,406.72 622.65,402.13 625.72,397.11 628.79,392.49 631.85,389.33 634.92,387.98 637.99,388.42 641.06,390.51 644.12,393.52 647.19,396.77 650.26,400.14 653.33,403.61 656.39,406.98 659.46,409.61 662.53,411.10 665.60,411.39 668.66,410.52 671.73,409.02 674.80,407.83 677.86,407.40 680.93,407.76 684.00,408.59 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,98.35 76.65,95.69 79.72,94.90 82.79,97.03 85.85,102.06 88.92,109.34 91.99,117.47 95.06,125.71 98.12,134.01 101.19,142.30 104.26,149.86 107.33,155.66 110.39,159.30 113.46,160.79 116.53,160.19 119.60,157.97 122.66,154.61 125.73,150.21 128.80,144.77 131.86,138.52 134.93,132.20 138.00,126.36 141.07,121.08 144.13,116.36 147.20,112.49 150.27,110.05 153.34,109.38 156.40,110.47 159.47,113.31 162.54,117.52 165.61,122.58 168.67,128.31 171.74,134.68 174.81,141.66 177.88,148.96 180.94,156.27 184.01,163.53 187.08,170.74 190.15,177.78 193.21,184.33 196.28,190.13 199.35,195.13 202.42,199.35 205.48,202.78 208.55,205.42 211.62,207.27 214.69,208.32 217.75,208.67 220.82,209.21 223.89,211.24 226.95,215.22 230.02,221.14 233.09,228.79 236.16,236.91 239.22,244.25 242.29,250.53 245.36,255.75 248.43,260.15 251.49,264.47 254.56,269.25 257.63,274.55 260.70,280.35 263.76,286.24 266.83,291.36 269.90,295.26 272.97,297.92 276.03,299.42 279.10,300.44 282.17,301.95 285.24,304.30 288.30,307.48 291.37,311.50 294.44,316.34 297.51,321.98 300.57,328.41 303.64,335.64 306.71,343.28 309.78,350.23 312.84,355.63 315.91,359.42 318.98,361.58 322.04,362.37 325.11,362.23 328.18,361.40 331.25,359.91 334.31,357.83 337.38,355.90 340.45,355.18 343.52,356.01 346.58,358.41 349.65,362.06 352.72,365.39 355.79,366.82 358.85,366.02 361.92,363.01 364.99,358.27 368.06,353.27 371.12,349.08 374.19,345.82 377.26,343.51 380.33,342.59 383.39,343.92 386.46,347.94 389.53,354.67 392.60,363.95 395.66,374.12 398.73,382.95 401.80,389.68 404.86,394.30 407.93,397.11 411.00,399.50 414.07,402.87 417.13,407.51 420.20,413.41 423.27,420.00 426.34,425.66 429.40,429.22 432.47,430.55 435.54,429.66 438.61,426.76 441.67,422.23 444.74,416.27 447.81,408.89 450.88,400.21 453.94,391.48 457.01,384.33 460.08,379.31 463.15,376.43 466.21,375.36 469.28,374.54 472.35,372.41 475.42,368.68 478.48,363.36 481.55,357.11 484.62,351.84 487.69,348.91 490.75,348.46 493.82,350.45 496.89,354.26 499.95,358.75 503.02,363.31 506.09,367.94 509.16,372.60 512.22,377.06 515.29,380.99 518.36,384.30 521.43,386.97 524.49,389.07 527.56,390.86 530.63,392.57 533.70,394.27 536.76,395.94 539.83,397.59 542.90,399.22 545.97,400.83 549.03,402.43 552.10,404.02 555.17,405.77 558.24,407.99 561.30,410.83 564.37,414.31 567.44,418.33 570.51,422.09 573.57,424.54 576.64,425.34 579.71,424.50 582.78,422.19 585.84,419.26 588.91,416.52 591.98,414.11 595.04,412.04 598.11,410.21 601.18,408.41 604.25,406.48 607.31,404.39 610.38,402.17 613.45,400.08 616.52,398.62 619.58,398.04 622.65,398.34 625.72,399.41 628.79,400.23 631.85,399.50 634.92,396.82 637.99,392.17 641.06,385.90 644.12,379.61 647.19,374.79 650.26,371.70 653.33,370.35 656.39,370.52 659.46,371.65 662.53,373.33 665.60,375.53 668.66,378.24 671.73,381.11 674.80,383.54 677.86,385.23 680.93,386.17 684.00,386.46 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,94.50 76.65,97.85 79.72,100.30 82.79,100.83 85.85,99.51 88.92,97.62 91.99,97.83 95.06,101.65 98.12,109.16 101.19,120.19 104.26,132.93 107.33,144.74 110.39,154.67 113.46,162.68 116.53,168.69 119.60,172.09 122.66,172.29 125.73,169.14 128.80,162.64 131.86,153.43 134.93,143.54 138.00,134.53 141.07,126.58 144.13,119.71 147.20,114.21 150.27,110.70 153.34,109.51 156.40,110.66 159.47,114.11 162.54,119.47 165.61,126.14 168.67,133.92 171.74,142.80 174.81,152.65 177.88,162.69 180.94,172.12 184.01,180.76 187.08,188.61 190.15,195.40 193.21,200.24 196.28,202.49 199.35,202.07 202.42,199.02 205.48,194.86 208.55,192.62 211.62,193.95 214.69,198.91 217.75,207.36 220.82,217.60 223.89,227.28 226.95,235.55 230.02,242.38 233.09,247.87 236.16,252.47 239.22,256.64 242.29,260.47 245.36,263.98 248.43,267.12 251.49,269.85 254.56,272.11 257.63,273.89 260.70,275.21 263.76,276.45 266.83,278.35 269.90,281.31 272.97,285.36 276.03,290.49 279.10,296.69 282.17,303.95 285.24,312.25 288.30,321.60 291.37,331.67 294.44,340.74 297.51,347.05 300.57,350.26 303.64,350.35 306.71,347.75 309.78,343.66 312.84,339.00 315.91,333.87 318.98,328.30 322.04,323.32 325.11,320.90 328.18,322.09 331.25,326.93 334.31,335.25 337.38,345.29 340.45,354.64 343.52,362.44 346.58,368.71 349.65,373.47 352.72,376.92 355.79,379.27 358.85,380.55 361.92,380.76 364.99,380.08 368.06,379.02 371.12,377.94 374.19,376.89 377.26,375.87 380.33,375.09 383.39,374.95 386.46,375.64 389.53,377.19 392.60,379.55 395.66,382.37 398.73,385.16 401.80,387.77 404.86,390.19 407.93,392.41 411.00,394.36 414.07,395.97 417.13,397.23 420.20,398.14 423.27,398.72 426.34,399.01 429.40,399.07 432.47,398.88 435.54,398.44 438.61,397.61 441.67,396.14 444.74,393.88 447.81,390.84 450.88,387.06 453.94,383.16 457.01,379.93 460.08,377.65 463.15,376.31 466.21,375.88 469.28,376.16 472.35,376.99 475.42,378.32 478.48,380.15 481.55,382.23 484.62,383.87 487.69,384.57 490.75,384.29 493.82,383.03 496.89,381.18 499.95,379.43 503.02,378.14 506.09,377.32 509.16,376.98 512.22,377.12 515.29,377.80 518.36,379.01 521.43,380.75 524.49,382.95 527.56,385.25 530.63,387.30 533.70,389.02 536.76,390.43 539.83,391.59 542.90,392.69 545.97,393.87 549.03,395.16 552.10,396.52 555.17,397.66 558.24,398.02 561.30,397.31 564.37,395.52 567.44,392.75 570.51,389.76 573.57,387.59 576.64,386.55 579.71,386.66 582.78,387.70 585.84,388.73 588.91,388.82 591.98,387.81 595.04,385.71 598.11,383.06 601.18,381.32 604.25,381.53 607.31,383.80 610.38,388.09 613.45,393.84 616.52,400.07 619.58,406.29 622.65,412.47 625.72,418.56 628.79,424.13 631.85,428.59 634.92,431.77 637.99,433.66 641.06,434.41 644.12,434.67 647.19,435.07 650.26,435.71 653.33,436.59 656.39,437.61 659.46,438.54 662.53,439.17 665.60,439.51 668.66,439.54 671.73,439.21 674.80,438.41 677.86,437.07 680.93,435.20 684.00,433.27 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,112.61 76.65,119.59 79.72,124.88 82.79,126.48 85.85,124.43 88.92,120.29 91.99,117.29 95.06,117.22 98.12,120.18 101.19,126.02 104.26,133.04 107.33,138.77 110.39,142.31 113.46,143.65 116.53,142.93 119.60,140.98 122.66,138.67 125.73,136.20 128.80,133.56 131.86,130.96 134.93,128.98 138.00,128.10 141.07,128.38 144.13,129.80 147.20,131.85 150.27,133.51 153.34,134.21 156.40,133.93 159.47,132.75 162.54,131.64 165.61,132.00 168.67,134.31 171.74,138.60 174.81,144.82 177.88,152.83 180.94,162.46 184.01,173.66 187.08,186.45 190.15,199.95 193.21,211.54 196.28,219.19 199.35,222.65 202.42,222.00 205.48,218.71 208.55,215.72 211.62,214.64 214.69,215.56 217.75,218.37 220.82,222.08 223.89,225.27 226.95,227.43 230.02,228.56 233.09,228.81 236.16,229.04 239.22,230.12 242.29,232.24 245.36,235.39 248.43,239.52 251.49,244.44 254.56,250.02 257.63,256.25 260.70,263.14 263.76,270.83 266.83,279.65 269.90,289.77 272.97,301.18 276.03,313.77 279.10,326.22 282.17,336.72 285.24,344.62 288.30,349.91 291.37,352.68 294.44,353.34 297.51,352.32 300.57,349.70 303.64,345.50 306.71,340.03 309.78,334.23 312.84,328.82 315.91,323.87 318.98,319.39 322.04,315.81 325.11,313.94 328.18,314.20 331.25,316.62 334.31,321.09 337.38,326.73 340.45,332.29 343.52,337.35 346.58,341.91 349.65,346.03 352.72,350.12 355.79,354.56 358.85,359.43 361.92,364.73 364.99,370.10 368.06,374.48 371.12,377.09 374.19,377.84 377.26,376.80 380.33,375.19 383.39,375.41 386.46,378.69 389.53,385.09 392.60,394.38 395.66,404.35 398.73,412.02 401.80,416.37 404.86,417.38 407.93,415.37 411.00,411.83 414.07,408.25 417.13,404.93 420.20,401.86 423.27,398.97 426.34,396.06 429.40,392.96 432.47,389.68 435.54,386.21 438.61,382.70 441.67,379.42 444.74,376.51 447.81,373.99 450.88,371.86 453.94,370.13 457.01,368.87 460.08,368.08 463.15,367.75 466.21,367.87 469.28,368.23 472.35,368.67 475.42,369.15 478.48,369.67 481.55,370.11 484.62,370.16 487.69,369.59 490.75,368.37 493.82,366.53 496.89,364.65 499.95,363.81 503.02,364.55 506.09,366.88 509.16,370.72 512.22,375.12 515.29,378.86 518.36,381.52 521.43,383.12 524.49,383.88 527.56,384.96 530.63,387.49 533.70,391.65 536.76,397.46 539.83,404.19 542.90,409.87 545.97,413.08 549.03,413.69 552.10,411.77 555.17,408.49 558.24,406.03 561.30,405.47 564.37,406.87 567.44,410.05 570.51,413.64 573.57,415.82 576.64,416.00 579.71,414.18 582.78,410.69 585.84,407.04 588.91,404.65 591.98,403.81 595.04,404.51 598.11,406.45 601.18,408.84 604.25,411.11 607.31,413.22 610.38,415.13 613.45,416.44 616.52,416.36 619.58,414.53 622.65,410.92 625.72,405.73 628.79,400.56 631.85,397.47 634.92,397.13 637.99,399.53 641.06,404.25 644.12,409.40 647.19,413.16 650.26,415.21 653.33,415.55 656.39,414.56 659.46,413.21 662.53,412.18 665.60,411.53 668.66,411.25 671.73,410.87 674.80,409.60 677.86,407.06 680.93,403.22 684.00,399.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,75.91 76.65,73.42 79.72,72.04 82.79,72.60 85.85,75.09 88.92,79.39 91.99,85.23 95.06,92.45 98.12,101.06 101.19,110.97 104.26,121.35 107.33,130.99 110.39,139.45 113.46,146.71 116.53,152.75 119.60,157.40 122.66,160.46 125.73,161.91 128.80,161.73 131.86,160.03 134.93,157.04 138.00,152.98 141.07,147.86 144.13,141.72 147.20,135.63 150.27,131.73 153.34,131.22 156.40,134.16 159.47,140.36 162.54,147.81 165.61,153.62 168.67,156.76 171.74,157.19 174.81,155.27 177.88,152.83 180.94,151.77 184.01,152.51 187.08,155.06 190.15,159.17 193.21,164.14 196.28,169.44 199.35,174.98 202.42,180.79 205.48,187.05 208.55,194.14 211.62,202.24 214.69,211.39 217.75,221.53 220.82,232.19 223.89,242.72 226.95,252.89 230.02,262.69 233.09,271.92 236.16,279.52 239.22,284.39 242.29,286.29 245.36,285.24 248.43,281.69 251.49,277.06 254.56,272.42 257.63,267.90 260.70,263.53 263.76,260.51 266.83,261.18 269.90,266.80 272.97,277.43 276.03,292.75 279.10,309.49 282.17,323.11 285.24,332.02 288.30,336.19 291.37,336.02 294.44,333.57 297.51,330.93 300.57,328.54 303.64,326.39 306.71,324.52 309.78,322.96 312.84,321.78 315.91,320.97 318.98,320.53 322.04,320.54 325.11,321.10 328.18,322.28 331.25,324.09 334.31,326.47 337.38,328.90 340.45,330.67 343.52,331.54 346.58,331.50 349.65,330.81 352.72,330.77 355.79,332.66 358.85,336.76 361.92,343.05 364.99,350.96 368.06,358.77 371.12,365.20 374.19,370.13 377.26,373.58 380.33,376.12 383.39,378.83 386.46,382.28 389.53,386.49 392.60,391.42 395.66,396.73 398.73,401.95 401.80,406.93 404.86,411.66 407.93,416.07 411.00,419.87 414.07,422.73 417.13,424.61 420.20,425.49 423.27,425.21 426.34,423.25 429.40,419.25 432.47,413.16 435.54,405.05 438.61,396.40 441.67,390.00 444.74,387.28 447.81,388.29 450.88,392.77 453.94,398.13 457.01,400.92 460.08,399.99 463.15,395.33 466.21,387.51 469.28,379.25 472.35,373.23 475.42,369.97 478.48,369.47 481.55,370.95 484.62,372.23 487.69,371.73 490.75,369.30 493.82,364.99 496.89,359.94 499.95,356.27 503.02,355.05 506.09,356.32 509.16,360.00 512.22,365.20 515.29,370.79 518.36,376.38 521.43,381.97 524.49,387.40 527.56,391.86 530.63,394.55 533.70,395.35 536.76,394.24 539.83,391.99 542.90,390.70 545.97,391.86 549.03,395.61 552.10,401.89 555.17,409.47 558.24,416.11 561.30,420.68 564.37,423.14 567.44,423.60 570.51,423.07 573.57,422.86 576.64,423.40 579.71,424.68 582.78,426.58 585.84,428.45 588.91,429.69 591.98,430.19 595.04,429.95 598.11,429.00 601.18,427.43 604.25,425.30 607.31,422.63 610.38,419.41 613.45,415.80 616.52,412.10 619.58,408.43 622.65,404.81 625.72,401.29 628.79,398.31 631.85,396.45 634.92,395.89 637.99,396.64 641.06,398.46 644.12,400.30 647.19,401.18 650.26,400.91 653.33,399.50 656.39,397.27 659.46,395.09 662.53,393.55 665.60,392.71 668.66,392.56 671.73,392.90 674.80,393.41 677.86,393.91 680.93,394.39 684.00,394.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,137.12 76.65,130.49 79.72,124.64 82.79,121.29 85.85,120.43 88.92,121.71 91.99,124.40 95.06,128.09 98.12,132.76 101.19,138.30 104.26,143.67 107.33,147.32 110.39,148.69 113.46,147.75 116.53,144.75 119.60,140.87 122.66,137.40 125.73,134.62 128.80,132.52 131.86,130.94 134.93,129.37 138.00,127.39 141.07,124.96 144.13,122.11 147.20,119.62 150.27,119.10 153.34,121.44 156.40,126.69 159.47,134.72 162.54,144.21 165.61,153.29 168.67,161.27 171.74,168.14 174.81,173.83 177.88,178.00 180.94,180.27 184.01,180.57 187.08,178.90 190.15,175.86 193.21,173.33 196.28,172.75 199.35,174.28 202.42,177.89 205.48,183.03 208.55,188.54 211.62,193.81 214.69,198.79 217.75,203.52 220.82,208.18 223.89,213.05 226.95,218.22 230.02,223.70 233.09,229.58 236.16,236.40 239.22,244.72 242.29,254.64 245.36,266.16 248.43,278.48 251.49,289.14 254.56,296.29 257.63,299.73 260.70,299.49 263.76,296.66 266.83,293.38 269.90,290.79 272.97,288.94 276.03,287.86 279.10,287.73 282.17,288.81 285.24,291.19 288.30,294.87 291.37,299.78 294.44,305.55 297.51,311.81 300.57,318.49 303.64,325.59 306.71,332.89 309.78,339.76 312.84,345.75 315.91,350.80 318.98,354.92 322.04,358.24 325.11,361.01 328.18,363.36 331.25,365.30 334.31,366.81 337.38,367.72 340.45,367.79 343.52,366.94 346.58,365.16 349.65,362.55 352.72,359.50 355.79,356.44 358.85,353.45 361.92,350.55 364.99,348.08 368.06,347.14 371.12,348.53 374.19,352.31 377.26,358.47 380.33,366.14 383.39,373.69 386.46,380.25 389.53,385.79 392.60,390.30 395.66,393.75 398.73,396.07 401.80,397.23 404.86,397.25 407.93,396.39 411.00,395.99 414.07,397.38 417.13,400.81 420.20,406.29 423.27,412.86 426.34,417.79 429.40,419.09 432.47,416.56 435.54,410.27 438.61,401.99 441.67,395.02 444.74,391.09 447.81,390.26 450.88,392.31 453.94,395.27 457.01,396.49 460.08,395.08 463.15,391.04 466.21,384.67 469.28,377.48 472.35,370.93 475.42,365.31 478.48,360.61 481.55,356.73 484.62,353.33 487.69,350.19 490.75,347.28 493.82,344.60 496.89,342.41 499.95,341.15 503.02,341.03 506.09,342.07 509.16,344.26 512.22,347.46 515.29,351.50 518.36,356.30 521.43,361.87 524.49,368.17 527.56,374.95 530.63,381.97 533.70,389.20 536.76,396.62 539.83,403.84 542.90,409.76 545.97,413.58 549.03,415.24 552.10,414.78 555.17,413.35 558.24,413.08 561.30,415.01 564.37,419.18 567.44,425.41 570.51,432.06 573.57,436.99 576.64,439.51 579.71,439.62 582.78,437.51 585.84,434.12 588.91,430.35 591.98,426.36 595.04,422.15 598.11,417.89 601.18,414.03 604.25,410.89 607.31,408.49 610.38,406.86 613.45,406.18 616.52,406.82 619.58,408.97 622.65,412.62 625.72,417.69 628.79,423.39 631.85,428.74 634.92,433.41 637.99,437.41 641.06,440.56 644.12,442.14 647.19,441.45 650.26,438.37 653.33,432.91 656.39,425.96 659.46,419.94 662.53,416.51 665.60,415.83 668.66,417.85 671.73,421.66 674.80,425.64 677.86,429.01 680.93,431.75 684.00,433.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,119.14 76.65,122.98 79.72,125.13 82.79,124.33 85.85,120.61 88.92,115.32 91.99,111.24 95.06,109.91 98.12,111.42 101.19,115.67 104.26,121.65 107.33,127.89 110.39,133.84 113.46,139.49 116.53,144.68 119.60,148.46 122.66,149.87 125.73,148.68 128.80,144.90 131.86,138.94 134.93,132.15 138.00,125.55 141.07,119.26 144.13,113.31 147.20,108.40 150.27,105.98 153.34,106.83 156.40,111.00 159.47,118.39 162.54,127.97 165.61,138.29 168.67,148.82 171.74,159.55 174.81,170.22 177.88,179.46 180.94,185.83 184.01,189.04 187.08,189.07 190.15,187.06 193.21,186.49 196.28,190.03 199.35,197.97 202.42,210.24 205.48,224.74 208.55,237.27 211.62,245.55 214.69,249.46 217.75,249.14 220.82,246.13 223.89,242.56 226.95,239.21 230.02,236.09 233.09,233.22 236.16,230.73 239.22,228.78 242.29,227.39 245.36,226.56 248.43,226.59 251.49,228.37 254.56,232.59 257.63,239.32 260.70,248.54 263.76,259.52 266.83,270.89 269.90,281.87 272.97,292.44 276.03,302.57 279.10,311.92 282.17,320.03 285.24,326.75 288.30,332.07 291.37,336.08 294.44,339.28 297.51,342.17 300.57,344.87 303.64,347.35 306.71,349.39 309.78,350.23 312.84,349.32 315.91,346.61 318.98,342.12 322.04,336.83 325.11,332.59 328.18,330.40 331.25,330.30 334.31,332.22 337.38,335.51 340.45,339.26 343.52,343.17 346.58,347.22 349.65,351.45 352.72,355.93 355.79,360.78 358.85,366.01 361.92,371.61 364.99,377.17 368.06,381.49 371.12,383.66 374.19,383.60 377.26,381.34 380.33,377.71 383.39,374.34 386.46,372.05 389.53,370.88 392.60,370.79 395.66,371.27 398.73,371.68 401.80,371.77 404.86,371.55 407.93,371.25 411.00,372.03 414.07,375.03 417.13,380.49 420.20,388.40 423.27,397.75 426.34,405.69 429.40,410.13 432.47,410.86 435.54,407.94 438.61,402.67 441.67,397.53 444.74,393.77 447.81,391.47 450.88,390.50 453.94,389.93 457.01,388.47 460.08,385.70 463.15,381.62 466.21,376.48 469.28,371.52 472.35,367.95 475.42,366.00 478.48,365.68 481.55,366.62 484.62,367.77 487.69,368.41 490.75,368.45 493.82,367.92 496.89,367.40 499.95,368.00 503.02,370.26 506.09,374.20 509.16,379.68 512.22,385.47 515.29,389.89 518.36,392.40 521.43,393.01 524.49,391.98 527.56,390.62 530.63,390.18 533.70,390.90 536.76,392.77 539.83,395.37 542.90,397.51 545.97,398.32 549.03,397.74 552.10,395.80 555.17,393.49 558.24,392.61 561.30,394.05 564.37,397.84 567.44,403.83 570.51,410.55 573.57,416.08 576.64,419.80 579.71,421.73 582.78,422.03 585.84,421.58 588.91,421.21 591.98,421.06 595.04,421.14 598.11,421.32 601.18,421.22 604.25,420.59 607.31,419.42 610.38,417.70 613.45,415.61 616.52,413.45 619.58,411.35 622.65,409.34 625.72,407.44 628.79,405.92 631.85,405.12 634.92,405.17 637.99,406.06 641.06,407.71 644.12,409.84 647.19,412.16 650.26,414.61 653.33,417.19 656.39,419.59 659.46,420.95 662.53,420.68 665.60,418.75 668.66,415.17 671.73,410.67 674.80,406.54 677.86,403.38 680.93,401.23 684.00,400.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,79.64 76.65,87.18 79.72,94.32 82.79,99.22 85.85,101.89 88.92,102.95 91.99,103.65 95.06,104.70 98.12,106.13 101.19,107.96 104.26,110.24 107.33,113.06 110.39,116.47 113.46,120.46 116.53,124.91 119.60,129.10 122.66,132.29 125.73,134.32 128.80,135.19 131.86,135.23 134.93,135.52 138.00,136.88 141.07,139.40 144.13,143.08 147.20,147.15 150.27,150.10 153.34,151.10 156.40,150.11 159.47,147.23 162.54,143.61 165.61,140.88 168.67,139.64 171.74,139.89 174.81,141.58 177.88,144.42 180.94,148.13 184.01,152.64 187.08,157.95 190.15,164.04 193.21,170.90 196.28,178.50 199.35,186.84 202.42,195.88 205.48,204.87 208.55,212.28 211.62,217.28 214.69,219.82 217.75,220.05 220.82,219.53 223.89,220.46 226.95,223.62 230.02,229.02 233.09,236.42 236.16,244.52 239.22,251.98 242.29,258.53 245.36,264.17 248.43,269.01 251.49,273.45 254.56,277.77 257.63,282.01 260.70,286.16 263.76,290.01 266.83,293.13 269.90,295.30 272.97,296.51 276.03,296.86 279.10,297.47 282.17,299.89 285.24,304.66 288.30,311.79 291.37,320.88 294.44,329.89 297.51,336.74 300.57,340.98 303.64,342.64 306.71,342.19 309.78,341.11 312.84,340.49 315.91,340.44 318.98,340.97 322.04,341.94 325.11,343.08 328.18,344.25 331.25,345.46 334.31,346.71 337.38,348.24 340.45,350.33 343.52,353.09 346.58,356.53 349.65,360.57 352.72,364.83 355.79,368.91 358.85,372.74 361.92,376.32 364.99,379.51 368.06,381.91 371.12,383.22 374.19,383.42 377.26,382.52 380.33,380.93 383.39,379.46 386.46,378.52 389.53,378.12 392.60,378.22 395.66,378.33 398.73,377.80 401.80,376.39 404.86,374.10 407.93,371.19 411.00,368.85 414.07,368.28 417.13,369.72 420.20,373.15 423.27,377.97 426.34,382.38 429.40,385.09 432.47,385.96 435.54,385.03 438.61,383.18 441.67,382.04 444.74,382.47 447.81,384.50 450.88,388.01 453.94,391.87 457.01,394.55 460.08,395.56 463.15,394.89 466.21,392.67 469.28,389.47 472.35,385.90 475.42,382.05 478.48,377.93 481.55,373.88 484.62,370.85 487.69,369.53 490.75,369.98 493.82,372.19 496.89,375.65 499.95,379.41 503.02,382.98 506.09,386.36 509.16,389.50 512.22,392.00 515.29,393.32 518.36,393.30 521.43,391.93 524.49,389.39 527.56,386.54 530.63,384.22 533.70,382.59 536.76,381.64 539.83,381.51 542.90,382.54 545.97,385.00 549.03,388.90 552.10,394.20 555.17,400.16 558.24,405.35 561.30,409.07 564.37,411.31 567.44,412.12 570.51,412.08 573.57,411.93 576.64,411.91 579.71,412.02 582.78,412.30 585.84,412.90 588.91,413.97 591.98,415.53 595.04,417.58 598.11,420.01 601.18,422.48 604.25,424.79 607.31,426.90 610.38,428.80 613.45,430.25 616.52,430.80 619.58,430.24 622.65,428.54 625.72,425.82 628.79,422.91 631.85,420.89 634.92,420.11 637.99,420.56 641.06,422.12 644.12,424.23 647.19,426.32 650.26,428.32 653.33,430.21 656.39,431.98 659.46,433.57 662.53,434.95 665.60,436.12 668.66,437.08 671.73,438.06 674.80,439.45 677.86,441.45 680.93,444.05 684.00,446.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,78.73 76.65,85.66 79.72,92.79 82.79,98.55 85.85,102.95 88.92,106.42 91.99,109.87 95.06,113.80 98.12,118.23 101.19,123.11 104.26,127.89 107.33,131.75 110.39,134.40 113.46,135.82 116.53,136.19 119.60,136.39 122.66,137.37 125.73,139.34 128.80,142.30 131.86,145.88 134.93,148.89 138.00,150.43 141.07,150.39 144.13,148.79 147.20,146.23 150.27,143.93 153.34,142.55 156.40,142.12 159.47,142.66 162.54,144.09 165.61,146.34 168.67,149.38 171.74,153.21 174.81,157.64 177.88,161.60 180.94,164.01 184.01,164.61 187.08,163.42 190.15,161.19 193.21,160.24 196.28,162.35 199.35,167.73 202.42,176.34 205.48,187.16 208.55,198.14 211.62,208.18 214.69,217.21 217.75,225.23 220.82,231.98 223.89,237.13 226.95,240.58 230.02,242.30 233.09,242.50 236.16,242.15 239.22,242.27 242.29,243.08 245.36,244.57 248.43,246.76 251.49,249.70 254.56,253.43 257.63,257.95 260.70,263.24 263.76,269.03 266.83,274.72 269.90,280.01 272.97,284.89 276.03,289.43 279.10,294.33 282.17,300.60 285.24,308.57 288.30,318.27 291.37,329.33 294.44,339.97 297.51,348.36 300.57,354.11 303.64,357.24 306.71,358.08 309.78,357.66 312.84,356.75 315.91,355.43 318.98,353.69 322.04,351.64 325.11,349.42 328.18,347.12 331.25,344.76 334.31,342.37 337.38,340.40 340.45,339.47 343.52,339.78 346.58,341.34 349.65,343.95 352.72,346.63 355.79,348.37 358.85,348.98 361.92,348.46 364.99,347.27 368.06,346.76 371.12,347.93 374.19,350.88 377.26,355.59 380.33,361.51 383.39,367.59 386.46,373.26 389.53,378.52 392.60,383.36 395.66,387.80 398.73,391.87 401.80,395.58 404.86,398.93 407.93,401.99 411.00,405.09 414.07,408.57 417.13,412.50 420.20,416.86 423.27,421.16 426.34,423.95 429.40,424.16 432.47,421.70 435.54,416.59 438.61,409.56 441.67,401.98 444.74,394.57 447.81,387.34 450.88,380.37 453.94,374.32 457.01,370.09 460.08,367.96 463.15,367.95 466.21,369.81 469.28,372.44 472.35,374.75 475.42,376.52 478.48,377.75 481.55,378.30 484.62,377.72 487.69,375.71 490.75,372.25 493.82,367.38 496.89,362.44 499.95,359.90 503.02,361.00 506.09,365.80 509.16,374.12 512.22,384.26 515.29,394.02 518.36,402.65 521.43,410.16 524.49,416.39 527.56,420.63 530.63,422.19 533.70,420.94 536.76,416.88 539.83,410.61 542.90,403.73 545.97,397.38 549.03,391.69 552.10,386.66 555.17,382.46 558.24,379.40 561.30,377.64 564.37,377.19 567.44,378.01 570.51,379.84 573.57,382.35 576.64,385.41 579.71,389.03 582.78,393.11 585.84,397.13 588.91,400.61 591.98,403.47 595.04,405.70 598.11,407.41 601.18,408.85 604.25,410.21 607.31,411.50 610.38,412.71 613.45,413.57 616.52,413.61 619.58,412.60 622.65,410.51 625.72,407.42 628.79,403.76 631.85,400.13 634.92,396.71 637.99,393.51 641.06,390.51 644.12,387.70 647.19,385.06 650.26,382.59 653.33,380.27 656.39,378.16 659.46,376.35 662.53,374.89 665.60,373.81 668.66,373.07 671.73,372.10 674.80,369.87 677.86,365.89 680.93,360.15 684.00,354.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,115.30 76.65,109.41 79.72,104.38 82.79,101.78 85.85,101.61 88.92,103.60 91.99,107.20 95.06,112.13 98.12,118.35 101.19,125.77 104.26,133.20 107.33,138.94 110.39,142.36 113.46,143.45 116.53,142.49 119.60,141.02 122.66,140.68 125.73,141.82 128.80,144.44 131.86,148.11 134.93,151.44 138.00,153.35 141.07,153.72 144.13,152.57 147.20,150.23 150.27,147.41 153.34,144.50 156.40,141.51 159.47,138.53 162.54,136.38 165.61,136.24 168.67,138.54 171.74,143.29 174.81,150.27 177.88,158.25 180.94,165.97 184.01,173.16 187.08,179.81 190.15,186.12 193.21,192.66 196.28,199.85 199.35,207.76 202.42,216.34 205.48,224.40 208.55,229.57 211.62,230.54 214.69,227.26 217.75,219.99 220.82,211.49 223.89,205.63 226.95,203.82 230.02,206.06 233.09,211.97 236.16,219.56 239.22,226.74 242.29,233.09 245.36,238.61 248.43,243.75 251.49,249.88 254.56,258.07 257.63,268.42 260.70,280.88 263.76,294.19 266.83,305.82 269.90,314.44 272.97,319.98 276.03,322.53 279.10,323.05 282.17,322.83 285.24,322.35 288.30,321.61 291.37,320.68 294.44,319.93 297.51,319.72 300.57,320.14 303.64,321.18 306.71,322.76 309.78,324.64 312.84,326.65 315.91,328.76 318.98,330.97 322.04,333.29 325.11,335.69 328.18,338.18 331.25,340.75 334.31,343.37 337.38,345.68 340.45,347.20 343.52,347.75 346.58,347.34 349.65,346.07 352.72,344.54 355.79,343.31 358.85,342.52 361.92,342.15 364.99,342.35 368.06,343.51 371.12,345.92 374.19,349.60 377.26,354.55 380.33,360.52 383.39,367.03 386.46,373.83 389.53,380.90 392.60,388.22 395.66,395.47 398.73,402.23 401.80,408.36 404.86,413.85 407.93,418.62 411.00,422.19 414.07,424.12 417.13,424.31 420.20,422.76 423.27,419.76 426.34,416.08 429.40,412.31 432.47,408.49 435.54,404.65 438.61,401.00 441.67,398.01 444.74,395.89 447.81,394.65 450.88,394.23 453.94,394.07 457.01,393.41 460.08,391.99 463.15,389.82 466.21,386.89 469.28,383.28 472.35,379.02 475.42,374.14 478.48,368.63 481.55,362.71 484.62,356.98 487.69,351.90 490.75,347.51 493.82,343.82 496.89,341.12 499.95,339.99 503.02,340.70 506.09,343.27 509.16,347.60 512.22,352.93 515.29,358.21 518.36,363.11 521.43,367.61 524.49,371.80 527.56,376.02 530.63,380.60 533.70,385.59 536.76,391.01 539.83,396.64 542.90,401.90 545.97,406.39 549.03,410.08 552.10,412.95 555.17,415.02 558.24,416.31 561.30,416.81 564.37,416.55 567.44,415.58 570.51,414.63 573.57,414.60 576.64,415.79 579.71,418.21 582.78,421.76 585.84,425.97 588.91,430.42 591.98,435.01 595.04,439.74 598.11,444.13 601.18,446.86 604.25,446.99 607.31,444.46 610.38,439.29 613.45,432.49 616.52,425.86 619.58,420.27 622.65,415.75 625.72,412.29 628.79,409.58 631.85,407.27 634.92,405.24 637.99,403.50 641.06,401.95 644.12,400.18 647.19,397.82 650.26,394.79 653.33,391.09 656.39,387.07 659.46,383.62 662.53,381.39 665.60,380.41 668.66,380.68 671.73,381.80 674.80,383.08 677.86,384.16 680.93,385.05 684.00,385.66 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,94.16 76.65,91.36 79.72,89.84 82.79,90.57 85.85,93.52 88.92,98.43 91.99,104.74 95.06,112.13 98.12,120.59 101.19,130.02 104.26,139.34 107.33,146.98 110.39,152.35 113.46,155.45 116.53,156.32 119.60,155.26 122.66,152.55 125.73,148.26 128.80,142.39 131.86,135.48 134.93,129.16 138.00,124.72 141.07,122.32 144.13,121.95 147.20,123.52 150.27,126.85 153.34,131.83 156.40,138.48 159.47,146.62 162.54,154.68 165.61,160.36 168.67,162.84 171.74,162.10 174.81,158.64 177.88,155.21 180.94,154.66 184.01,157.58 187.08,164.00 190.15,172.98 193.21,181.71 196.28,188.02 199.35,191.67 202.42,192.69 205.48,192.13 208.55,192.09 211.62,193.71 214.69,197.04 217.75,202.06 220.82,208.60 223.89,216.39 226.95,225.35 230.02,235.47 233.09,246.48 236.16,256.91 239.22,265.26 242.29,271.21 245.36,274.76 248.43,276.36 251.49,277.38 254.56,278.86 257.63,280.91 260.70,283.52 263.76,286.48 266.83,289.35 269.90,291.89 272.97,294.10 276.03,296.01 279.10,297.93 282.17,300.28 285.24,303.22 288.30,306.75 291.37,310.82 294.44,315.14 297.51,319.41 300.57,323.60 303.64,327.68 306.71,331.34 309.78,333.65 312.84,333.90 315.91,332.01 318.98,328.03 322.04,323.02 325.11,319.06 328.18,317.27 331.25,317.67 334.31,320.25 337.38,324.80 340.45,331.04 343.52,338.86 346.58,348.26 349.65,358.86 352.72,368.68 355.79,375.75 358.85,379.65 361.92,380.41 364.99,378.58 368.06,375.88 371.12,373.56 374.19,371.73 377.26,370.43 380.33,370.14 383.39,371.78 386.46,375.85 389.53,382.36 392.60,391.13 395.66,400.41 398.73,407.82 401.80,412.55 404.86,414.60 407.93,414.15 411.00,412.05 414.07,409.19 417.13,405.72 420.20,401.66 423.27,397.46 426.34,394.44 429.40,393.55 432.47,394.89 435.54,398.41 438.61,402.99 441.67,406.50 444.74,407.85 447.81,406.99 450.88,404.02 453.94,399.82 457.01,395.55 460.08,391.61 463.15,388.00 466.21,384.61 469.28,380.91 472.35,376.36 475.42,370.88 478.48,364.45 481.55,357.71 484.62,352.40 487.69,349.79 490.75,349.99 493.82,352.97 496.89,357.77 499.95,362.60 503.02,366.57 506.09,369.63 509.16,371.85 512.22,373.70 515.29,375.81 518.36,378.38 521.43,381.41 524.49,384.78 527.56,387.82 530.63,389.91 533.70,390.94 536.76,390.89 539.83,390.03 542.90,389.03 545.97,388.38 549.03,388.13 552.10,388.29 555.17,389.17 558.24,391.36 561.30,395.15 564.37,400.54 567.44,407.37 570.51,414.17 573.57,419.04 576.64,421.35 579.71,421.09 582.78,418.67 585.84,415.89 588.91,414.47 591.98,414.74 595.04,416.70 598.11,419.86 601.18,422.93 604.25,425.00 607.31,426.00 610.38,425.92 613.45,424.81 616.52,422.74 619.58,419.76 622.65,415.86 625.72,411.16 628.79,406.50 631.85,403.02 634.92,401.05 637.99,400.61 641.06,401.60 644.12,403.60 647.19,406.21 650.26,409.35 653.33,413.02 656.39,416.59 659.46,418.32 662.53,417.05 665.60,412.65 668.66,405.23 671.73,396.57 674.80,389.87 677.86,386.69 680.93,387.07 684.00,389.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,190.05 76.65,177.94 79.72,168.45 82.79,165.01 85.85,167.56 88.92,174.01 91.99,180.08 95.06,183.37 98.12,183.74 101.19,181.26 104.26,176.59 107.33,170.66 110.39,163.85 113.46,156.14 116.53,147.79 119.60,140.19 122.66,134.79 125.73,131.93 128.80,131.59 131.86,133.20 134.93,134.93 138.00,135.37 141.07,134.34 144.13,131.88 147.20,128.73 150.27,126.43 153.34,125.83 156.40,126.95 159.47,129.77 162.54,133.85 165.61,138.55 168.67,143.65 171.74,149.14 174.81,155.05 177.88,161.50 180.94,168.60 184.01,176.39 187.08,184.86 190.15,193.58 193.21,201.22 196.28,206.77 199.35,210.09 202.42,211.21 205.48,210.31 208.55,207.75 211.62,203.75 214.69,198.31 217.75,191.61 220.82,185.51 223.89,182.65 226.95,183.96 230.02,189.46 233.09,198.85 236.16,210.54 239.22,222.90 242.29,235.59 245.36,248.61 248.43,261.58 251.49,273.41 254.56,283.25 257.63,291.01 260.70,296.72 263.76,301.12 266.83,305.66 269.90,311.13 272.97,317.55 276.03,324.77 279.10,330.97 282.17,333.67 285.24,331.98 288.30,325.91 291.37,316.12 294.44,306.16 297.51,299.63 300.57,297.27 303.64,299.08 306.71,304.34 309.78,310.93 312.84,317.25 315.91,323.13 318.98,328.56 322.04,333.19 325.11,336.32 328.18,337.59 331.25,336.99 334.31,334.68 337.38,332.16 340.45,331.53 343.52,333.51 346.58,338.11 349.65,344.96 352.72,352.20 355.79,357.99 358.85,361.95 361.92,364.08 364.99,364.94 368.06,366.20 371.12,369.08 374.19,373.71 377.26,380.06 380.33,387.55 383.39,395.01 386.46,401.85 389.53,408.05 392.60,413.55 395.66,417.77 398.73,419.91 401.80,419.71 404.86,417.17 407.93,412.65 411.00,407.93 414.07,404.78 417.13,403.56 420.20,404.26 423.27,406.34 426.34,408.27 429.40,408.95 432.47,408.24 435.54,406.16 438.61,402.71 441.67,397.89 444.74,391.72 447.81,384.19 450.88,375.45 453.94,366.88 457.01,360.34 460.08,356.45 463.15,355.21 466.21,356.27 469.28,357.96 472.35,358.62 475.42,357.93 478.48,355.91 481.55,353.13 484.62,351.26 487.69,351.50 490.75,353.97 493.82,358.61 496.89,364.44 499.95,369.57 503.02,373.08 506.09,374.90 509.16,375.18 512.22,375.03 515.29,375.91 518.36,378.31 521.43,382.24 524.49,387.44 527.56,392.73 530.63,396.96 533.70,399.92 536.76,401.59 539.83,402.20 542.90,402.29 545.97,402.27 549.03,402.18 552.10,402.03 555.17,401.91 558.24,402.01 561.30,402.43 564.37,403.17 567.44,404.21 570.51,405.28 573.57,406.04 576.64,406.39 579.71,406.32 582.78,405.94 585.84,405.70 588.91,406.05 591.98,407.07 595.04,408.76 598.11,411.20 601.18,414.60 604.25,419.12 607.31,424.77 610.38,431.51 613.45,438.43 616.52,443.91 619.58,447.14 622.65,448.09 625.72,446.87 628.79,444.38 631.85,441.78 634.92,439.42 637.99,437.33 641.06,435.43 644.12,433.52 647.19,431.36 650.26,428.93 653.33,426.23 656.39,423.38 659.46,420.75 662.53,418.59 665.60,416.92 668.66,415.71 671.73,414.60 674.80,412.94 677.86,410.42 680.93,407.01 684.00,403.54 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,116.25 76.65,117.06 79.72,118.48 82.79,120.44 85.85,122.95 88.92,125.89 91.99,129.02 95.06,132.23 98.12,135.50 101.19,138.83 104.26,142.21 107.33,145.61 110.39,149.03 113.46,152.48 116.53,155.70 119.60,157.39 122.66,156.18 125.73,151.74 128.80,144.10 131.86,134.08 134.93,124.35 138.00,116.98 141.07,112.20 144.13,110.00 147.20,110.09 150.27,111.88 153.34,115.02 156.40,119.51 159.47,125.27 162.54,131.50 165.61,137.05 168.67,141.51 171.74,144.87 174.81,147.29 177.88,149.61 180.94,152.72 184.01,156.81 187.08,161.88 190.15,167.77 193.21,174.01 196.28,180.24 199.35,186.41 202.42,192.53 205.48,198.77 208.55,205.44 211.62,212.74 214.69,220.67 217.75,229.15 220.82,237.41 223.89,244.36 226.95,249.60 230.02,253.14 233.09,255.11 236.16,256.25 239.22,257.34 242.29,258.52 245.36,259.80 248.43,261.31 251.49,263.46 254.56,266.55 257.63,270.60 260.70,275.63 263.76,281.53 266.83,288.11 269.90,295.28 272.97,303.03 276.03,311.24 279.10,318.74 282.17,323.86 285.24,326.02 288.30,325.23 291.37,321.74 294.44,316.92 297.51,312.19 300.57,307.82 303.64,303.82 306.71,300.57 309.78,299.22 312.84,300.61 315.91,304.83 318.98,311.86 322.04,320.70 325.11,329.48 328.18,337.18 331.25,343.76 334.31,349.21 337.38,353.34 340.45,355.93 343.52,356.88 346.58,356.20 349.65,354.16 352.72,352.15 355.79,351.57 358.85,352.71 361.92,355.55 364.99,359.70 368.06,363.97 371.12,367.48 374.19,370.13 377.26,371.95 380.33,373.23 383.39,374.53 386.46,376.16 389.53,378.12 392.60,380.43 395.66,383.21 398.73,386.61 401.80,390.69 404.86,395.46 407.93,400.81 411.00,406.28 414.07,411.41 417.13,416.11 420.20,420.37 423.27,423.83 426.34,425.44 429.40,424.44 432.47,420.76 435.54,414.43 438.61,406.51 441.67,398.98 444.74,392.85 447.81,388.16 450.88,384.83 453.94,381.90 457.01,378.15 460.08,373.16 463.15,366.91 466.21,359.80 469.28,353.68 472.35,350.38 475.42,350.24 478.48,353.27 481.55,358.81 484.62,365.06 487.69,370.71 490.75,375.63 493.82,379.80 496.89,383.01 499.95,384.81 503.02,384.99 506.09,383.53 509.16,380.56 512.22,377.20 515.29,374.92 518.36,374.19 521.43,375.03 524.49,377.21 527.56,379.67 530.63,381.38 533.70,382.15 536.76,381.99 539.83,381.35 542.90,381.49 545.97,383.33 549.03,386.95 552.10,392.29 555.17,398.41 558.24,403.55 561.30,406.83 564.37,408.22 567.44,407.87 570.51,407.13 573.57,407.77 576.64,410.37 579.71,414.92 582.78,421.07 585.84,427.18 588.91,431.69 591.98,434.31 595.04,435.05 598.11,434.31 601.18,433.27 604.25,432.72 607.31,432.74 610.38,433.32 613.45,434.03 616.52,434.12 619.58,433.21 622.65,431.31 625.72,428.45 628.79,425.16 631.85,422.09 634.92,419.46 637.99,417.25 641.06,415.33 644.12,413.04 647.19,409.76 650.26,405.38 653.33,399.90 656.39,394.14 659.46,390.30 662.53,389.89 665.60,393.05 668.66,399.69 671.73,408.10 674.80,415.24 677.86,419.63 680.93,421.22 684.00,420.63 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,155.89 76.65,155.39 79.72,153.80 82.79,151.01 85.85,147.02 88.92,142.28 91.99,137.69 95.06,133.76 98.12,130.50 101.19,127.95 104.26,126.27 107.33,125.72 110.39,126.41 113.46,128.33 116.53,131.29 119.60,134.26 122.66,136.15 125.73,136.71 128.80,135.95 131.86,134.27 134.93,133.01 138.00,133.17 141.07,134.88 144.13,138.12 147.20,142.58 150.27,147.62 153.34,152.88 156.40,158.35 159.47,163.91 162.54,168.30 165.61,169.74 168.67,167.58 171.74,161.80 174.81,152.88 177.88,143.38 180.94,135.98 184.01,131.25 187.08,129.19 190.15,129.75 193.21,132.74 196.28,138.02 199.35,145.59 202.42,155.43 205.48,167.11 208.55,179.80 211.62,193.04 214.69,206.80 217.75,220.96 220.82,234.22 223.89,244.74 226.95,251.85 230.02,255.56 233.09,256.12 236.16,254.98 239.22,253.60 242.29,252.30 245.36,251.09 248.43,250.18 251.49,250.27 254.56,251.88 257.63,255.05 260.70,259.79 263.76,265.72 266.83,272.12 269.90,278.60 272.97,285.14 276.03,291.79 279.10,299.09 282.17,307.75 285.24,318.04 288.30,329.96 291.37,343.01 294.44,354.59 297.51,362.06 300.57,364.87 303.64,363.04 306.71,357.48 309.78,350.99 312.84,345.62 315.91,341.62 318.98,338.96 322.04,337.57 325.11,337.25 328.18,337.92 331.25,339.56 334.31,342.12 337.38,344.86 340.45,346.79 343.52,347.58 346.58,347.22 349.65,345.89 352.72,344.56 355.79,344.17 358.85,344.93 361.92,346.84 364.99,349.70 368.06,352.98 371.12,356.28 374.19,359.55 377.26,362.79 380.33,365.74 383.39,367.90 386.46,369.01 389.53,369.07 392.60,368.25 395.66,368.33 398.73,371.69 401.80,379.17 404.86,390.76 407.93,405.86 411.00,421.51 414.07,434.73 417.13,444.95 420.20,452.17 423.27,456.46 426.34,458.10 429.40,457.24 432.47,453.91 435.54,448.14 438.61,440.39 441.67,431.55 444.74,422.09 447.81,412.02 450.88,401.39 453.94,390.72 457.01,380.69 460.08,371.52 463.15,363.22 466.21,355.85 469.28,349.74 472.35,345.21 475.42,342.32 478.48,341.08 481.55,341.28 484.62,342.40 487.69,344.06 490.75,346.22 493.82,348.87 496.89,352.03 499.95,355.72 503.02,359.95 506.09,364.72 509.16,369.99 512.22,375.32 515.29,380.16 518.36,384.31 521.43,387.78 524.49,390.60 527.56,392.93 530.63,394.95 533.70,396.68 536.76,398.11 539.83,399.17 542.90,399.62 545.97,399.27 549.03,398.12 552.10,396.18 555.17,394.00 558.24,392.55 561.30,392.32 564.37,393.32 567.44,395.50 570.51,398.36 573.57,401.24 576.64,403.93 579.71,406.43 582.78,408.77 585.84,411.10 588.91,413.54 591.98,416.12 595.04,418.84 598.11,421.48 601.18,423.44 604.25,424.30 607.31,424.03 610.38,422.64 613.45,420.42 616.52,417.92 619.58,415.40 622.65,412.86 625.72,410.32 628.79,407.90 631.85,405.72 634.92,403.84 637.99,402.26 641.06,400.91 644.12,399.50 647.19,397.77 650.26,395.66 653.33,393.18 656.39,390.48 659.46,387.98 662.53,385.98 665.60,384.49 668.66,383.54 671.73,383.18 674.80,383.57 677.86,384.77 680.93,386.79 684.00,389.04 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,64.40 76.65,72.01 79.72,81.67 82.79,92.09 85.85,103.24 88.92,114.57 91.99,124.96 95.06,133.76 98.12,140.94 101.19,146.52 104.26,150.56 107.33,153.19 110.39,154.44 113.46,154.31 116.53,152.84 119.60,150.28 122.66,146.87 125.73,142.68 128.80,137.70 131.86,132.27 134.93,127.47 138.00,124.13 141.07,122.35 144.13,122.12 147.20,122.92 150.27,123.75 153.34,124.03 156.40,123.73 159.47,122.97 162.54,122.89 165.61,125.12 168.67,130.26 171.74,138.31 174.81,148.94 177.88,160.28 180.94,170.37 184.01,178.82 187.08,185.60 190.15,190.88 193.21,195.12 196.28,198.68 199.35,201.59 202.42,203.87 205.48,205.59 208.55,206.90 211.62,207.89 214.69,208.55 217.75,208.98 220.82,209.98 223.89,212.69 226.95,217.53 230.02,224.49 233.09,233.30 236.16,242.40 239.22,250.22 242.29,256.40 245.36,260.96 248.43,264.14 251.49,266.74 254.56,269.32 257.63,271.97 260.70,274.68 263.76,277.62 266.83,281.14 269.90,285.41 272.97,290.44 276.03,296.21 279.10,302.42 282.17,308.70 285.24,314.91 288.30,321.04 291.37,326.96 294.44,332.03 297.51,335.56 300.57,337.44 303.64,337.64 306.71,336.64 309.78,335.76 312.84,336.01 315.91,337.50 318.98,340.20 322.04,343.50 325.11,346.18 328.18,347.62 331.25,347.79 334.31,346.78 337.38,345.52 340.45,345.29 343.52,346.52 346.58,349.22 349.65,353.23 352.72,357.75 355.79,361.95 358.85,365.67 361.92,368.90 364.99,371.49 368.06,372.91 371.12,372.80 374.19,371.12 377.26,367.90 380.33,364.13 383.39,361.64 386.46,361.42 389.53,363.49 392.60,367.82 395.66,373.87 398.73,380.95 401.80,388.81 404.86,397.44 407.93,406.61 411.00,415.05 414.07,421.54 417.13,425.83 420.20,427.92 423.27,428.03 426.34,426.81 429.40,424.73 432.47,421.82 435.54,418.10 438.61,413.56 441.67,408.20 444.74,402.02 447.81,395.03 450.88,387.25 453.94,379.13 457.01,371.21 460.08,363.70 463.15,356.59 466.21,350.08 469.28,345.17 472.35,342.80 475.42,343.19 478.48,346.31 481.55,351.47 484.62,356.71 487.69,360.64 490.75,363.10 493.82,364.14 496.89,364.77 499.95,366.82 503.02,371.24 506.09,378.07 509.16,387.03 512.22,395.68 515.29,400.74 518.36,401.18 521.43,396.96 524.49,388.82 527.56,380.14 530.63,374.23 533.70,371.69 536.76,372.54 539.83,376.44 542.90,382.53 545.97,390.17 549.03,399.31 552.10,409.89 555.17,420.65 558.24,429.32 561.30,434.76 564.37,436.92 567.44,435.98 570.51,433.57 573.57,431.81 576.64,431.38 579.71,432.29 582.78,434.23 585.84,435.86 588.91,435.88 591.98,434.03 595.04,430.34 598.11,425.47 601.18,421.25 604.25,418.96 607.31,418.71 610.38,420.47 613.45,423.04 616.52,424.31 619.58,423.24 622.65,419.78 625.72,414.10 628.79,407.54 631.85,401.81 634.92,397.48 637.99,394.53 641.06,392.85 644.12,391.87 647.19,391.06 650.26,390.30 653.33,389.62 656.39,388.99 659.46,388.39 662.53,387.79 665.60,387.21 668.66,386.62 671.73,385.80 674.80,384.32 677.86,381.98 680.93,378.78 684.00,375.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,63.26 76.65,61.94 79.72,62.82 82.79,66.71 85.85,73.57 88.92,82.67 91.99,92.46 95.06,102.09 98.12,111.51 101.19,120.68 104.26,129.13 107.33,136.17 110.39,141.56 113.46,145.28 116.53,147.41 119.60,148.30 122.66,148.35 125.73,147.64 128.80,146.17 131.86,144.14 134.93,142.25 138.00,141.02 141.07,140.50 144.13,140.70 147.20,141.68 150.27,143.55 153.34,146.36 156.40,150.13 159.47,154.75 162.54,159.03 165.61,161.30 168.67,160.94 171.74,157.95 174.81,152.69 177.88,147.20 180.94,143.59 184.01,142.33 187.08,143.40 190.15,146.86 193.21,152.88 196.28,161.58 199.35,172.96 202.42,186.99 205.48,202.26 208.55,215.97 211.62,226.60 214.69,234.08 217.75,238.48 220.82,240.78 223.89,242.30 226.95,243.54 230.02,244.49 233.09,245.26 236.16,246.40 239.22,248.49 242.29,251.65 245.36,255.87 248.43,260.89 251.49,265.88 254.56,270.25 257.63,273.90 260.70,276.88 263.76,279.66 266.83,283.22 269.90,288.07 272.97,294.25 276.03,301.62 279.10,308.86 282.17,314.11 285.24,316.72 288.30,316.68 291.37,314.46 294.44,312.40 297.51,312.91 300.57,316.47 303.64,323.09 306.71,331.79 309.78,339.68 312.84,344.60 315.91,346.32 318.98,344.88 322.04,341.24 325.11,337.26 328.18,333.93 331.25,331.29 334.31,329.40 337.38,328.68 340.45,329.76 343.52,332.85 346.58,337.94 349.65,344.76 352.72,351.93 355.79,358.04 358.85,362.83 361.92,366.28 364.99,368.69 368.06,370.86 371.12,373.41 374.19,376.41 377.26,379.84 380.33,383.62 383.39,387.55 386.46,391.56 389.53,395.63 392.60,399.71 395.66,403.27 398.73,405.60 401.80,406.46 404.86,405.85 407.93,404.03 411.00,402.28 414.07,401.88 417.13,403.09 420.20,405.90 423.27,409.61 426.34,412.26 429.40,412.38 432.47,409.83 435.54,404.65 438.61,397.82 441.67,391.19 444.74,385.70 447.81,381.40 450.88,378.22 453.94,375.57 457.01,372.69 460.08,369.31 463.15,365.43 466.21,361.24 469.28,357.69 472.35,355.72 475.42,355.51 478.48,357.05 481.55,359.99 484.62,363.34 487.69,366.37 490.75,369.03 493.82,371.30 496.89,373.11 499.95,374.35 503.02,374.95 506.09,374.91 509.16,374.30 512.22,373.76 515.29,374.17 518.36,375.79 521.43,378.64 524.49,382.54 527.56,386.70 530.63,390.34 533.70,393.33 536.76,395.66 539.83,397.42 542.90,398.84 545.97,400.07 549.03,401.15 552.10,402.06 555.17,402.92 558.24,403.88 561.30,405.04 564.37,406.41 567.44,407.97 570.51,409.74 573.57,411.70 576.64,413.86 579.71,416.22 582.78,418.63 585.84,420.38 588.91,420.80 591.98,419.77 595.04,417.29 598.11,413.85 601.18,410.75 604.25,408.91 607.31,408.41 610.38,409.22 613.45,410.63 616.52,411.36 619.58,410.77 622.65,408.86 625.72,405.70 628.79,402.17 631.85,399.35 634.92,397.58 637.99,396.88 641.06,397.09 644.12,397.54 647.19,397.59 650.26,397.11 653.33,396.12 656.39,394.70 659.46,393.14 662.53,391.61 665.60,390.13 668.66,388.71 671.73,387.49 674.80,386.73 677.86,386.54 680.93,386.93 684.00,387.66 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,124.97 76.65,127.10 79.72,128.48 82.79,128.46 85.85,127.05 88.92,124.63 91.99,122.00 95.06,119.61 98.12,117.48 101.19,115.64 104.26,114.37 107.33,114.09 110.39,114.95 113.46,116.95 116.53,119.98 119.60,123.31 122.66,126.21 125.73,128.52 128.80,130.22 131.86,131.47 134.93,132.69 138.00,134.24 141.07,136.15 144.13,138.41 147.20,140.87 150.27,143.23 153.34,145.30 156.40,147.08 159.47,148.62 162.54,150.59 165.61,153.89 168.67,158.88 171.74,165.55 174.81,173.63 177.88,181.63 180.94,187.99 184.01,192.37 187.08,194.77 190.15,195.60 193.21,196.12 196.28,197.29 199.35,199.22 202.42,201.89 205.48,205.02 208.55,208.05 211.62,210.65 214.69,212.83 217.75,214.61 220.82,216.41 223.89,218.80 226.95,221.98 230.02,225.97 233.09,230.58 236.16,234.92 239.22,238.05 242.29,239.78 245.36,240.10 248.43,239.58 251.49,239.95 254.56,242.48 257.63,247.34 260.70,254.48 263.76,263.03 266.83,271.24 269.90,278.19 272.97,283.83 276.03,288.20 279.10,291.71 282.17,294.92 285.24,298.02 288.30,301.01 291.37,303.94 294.44,306.95 297.51,310.22 300.57,313.77 303.64,317.62 306.71,321.72 309.78,326.02 312.84,330.46 315.91,335.04 318.98,339.73 322.04,344.30 325.11,348.26 328.18,351.35 331.25,353.55 334.31,354.95 337.38,356.18 340.45,358.17 343.52,361.23 346.58,365.36 349.65,370.42 352.72,375.75 355.79,380.66 358.85,385.04 361.92,388.86 364.99,392.05 368.06,394.32 371.12,395.48 374.19,395.50 377.26,394.41 380.33,392.70 383.39,391.32 386.46,390.77 389.53,391.08 392.60,392.17 395.66,393.36 398.73,393.75 401.80,393.01 404.86,391.15 407.93,388.42 411.00,386.08 414.07,385.39 417.13,386.60 420.20,389.69 423.27,394.03 426.34,397.73 429.40,399.43 432.47,398.99 435.54,396.45 438.61,392.72 441.67,389.52 444.74,387.73 447.81,387.39 450.88,388.42 453.94,390.14 457.01,391.64 460.08,392.61 463.15,393.04 466.21,392.85 469.28,391.66 472.35,389.06 475.42,384.98 478.48,379.44 481.55,372.91 484.62,366.79 487.69,362.07 490.75,358.85 493.82,357.13 496.89,356.83 499.95,357.80 503.02,359.98 506.09,363.35 509.16,367.85 512.22,372.63 515.29,376.63 518.36,379.49 521.43,381.21 524.49,381.91 527.56,382.18 530.63,382.57 533.70,383.21 536.76,384.08 539.83,385.25 542.90,386.84 545.97,388.97 549.03,391.63 552.10,394.83 555.17,398.52 558.24,402.59 561.30,407.01 564.37,411.75 567.44,416.78 570.51,421.55 573.57,425.36 576.64,428.01 579.71,429.48 582.78,429.90 585.84,429.81 588.91,429.77 591.98,429.87 595.04,430.10 598.11,430.39 601.18,430.52 604.25,430.34 607.31,429.84 610.38,429.01 613.45,427.81 616.52,426.15 619.58,424.01 622.65,421.37 625.72,418.22 628.79,414.42 631.85,409.79 634.92,404.27 637.99,397.86 641.06,390.91 644.12,384.98 647.19,381.54 650.26,380.87 653.33,382.95 656.39,386.96 659.46,390.69 662.53,392.62 665.60,392.60 668.66,390.67 671.73,387.53 674.80,384.43 677.86,381.98 680.93,380.18 684.00,379.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,150.07 76.65,153.56 79.72,156.35 82.79,157.47 85.85,156.94 88.92,154.82 91.99,151.31 95.06,146.50 98.12,140.40 101.19,133.11 104.26,125.81 107.33,120.21 110.39,116.94 113.46,116.01 116.53,117.21 119.60,119.41 122.66,121.40 125.73,122.92 128.80,123.96 131.86,124.96 134.93,127.22 138.00,131.79 141.07,138.78 144.13,148.14 147.20,158.41 150.27,166.64 153.34,171.16 156.40,171.91 159.47,169.08 162.54,164.66 165.61,161.53 168.67,160.75 171.74,162.31 174.81,166.02 177.88,170.78 180.94,175.43 184.01,179.73 187.08,183.68 190.15,187.39 193.21,191.17 196.28,195.29 199.35,199.78 202.42,204.61 205.48,209.41 208.55,213.38 211.62,216.12 214.69,217.58 217.75,217.88 220.82,217.91 223.89,218.98 226.95,221.54 230.02,225.61 233.09,231.00 236.16,236.76 239.22,241.92 242.29,246.27 245.36,249.82 248.43,252.74 251.49,255.62 254.56,258.89 257.63,262.61 260.70,266.76 263.76,271.05 266.83,274.92 269.90,278.07 272.97,280.49 276.03,282.25 279.10,284.19 282.17,287.44 285.24,292.43 288.30,299.14 291.37,307.38 294.44,316.17 297.51,324.47 300.57,332.07 303.64,338.97 306.71,344.91 309.78,349.07 312.84,350.85 315.91,350.18 318.98,347.11 322.04,342.51 325.11,338.10 328.18,334.80 331.25,332.64 334.31,331.66 337.38,332.29 340.45,335.10 343.52,340.31 346.58,347.90 349.65,357.42 352.72,366.53 355.79,372.88 358.85,375.98 361.92,375.85 364.99,373.18 368.06,370.05 371.12,367.98 374.19,367.14 377.26,367.50 380.33,368.91 383.39,371.02 386.46,373.67 389.53,376.85 392.60,380.55 395.66,384.74 398.73,389.36 401.80,394.40 404.86,399.85 407.93,405.63 411.00,411.27 414.07,416.32 417.13,420.69 420.20,424.38 423.27,427.15 426.34,428.32 429.40,427.39 432.47,424.32 435.54,419.14 438.61,412.89 441.67,407.48 444.74,403.91 447.81,402.21 450.88,402.22 453.94,402.31 457.01,400.32 460.08,395.50 463.15,387.87 466.21,377.87 469.28,367.65 472.35,359.35 475.42,353.37 478.48,349.71 481.55,348.00 484.62,347.19 487.69,346.51 490.75,345.89 493.82,345.34 496.89,345.24 499.95,346.26 503.02,348.74 506.09,352.70 509.16,358.02 512.22,363.66 515.29,368.22 518.36,371.25 521.43,372.75 524.49,372.95 527.56,372.96 530.63,373.86 533.70,375.85 536.76,378.93 539.83,383.00 542.90,387.73 545.97,392.92 549.03,398.55 552.10,404.61 555.17,410.92 558.24,417.19 561.30,423.24 564.37,429.09 567.44,434.67 570.51,439.57 573.57,443.23 576.64,445.47 579.71,446.29 582.78,445.79 585.84,444.42 588.91,442.58 591.98,440.36 595.04,437.76 598.11,434.59 601.18,430.29 604.25,424.50 607.31,417.18 610.38,408.37 613.45,398.85 616.52,390.01 619.58,382.56 622.65,376.52 625.72,371.89 628.79,368.79 631.85,367.35 634.92,367.63 637.99,369.60 641.06,373.17 644.12,377.78 647.19,382.93 650.26,388.53 653.33,394.56 656.39,400.88 659.46,407.01 662.53,412.65 665.60,417.76 668.66,422.34 671.73,426.34 674.80,429.66 677.86,432.23 680.93,434.07 684.00,435.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,178.80 76.65,174.34 79.72,168.18 82.79,160.95 85.85,152.69 88.92,144.07 91.99,136.47 95.06,130.66 98.12,126.70 101.19,124.51 104.26,123.36 107.33,122.18 110.39,120.57 113.46,118.54 116.53,116.28 119.60,114.96 122.66,115.80 125.73,119.07 128.80,124.77 131.86,132.18 134.93,139.07 138.00,143.69 141.07,145.83 144.13,145.53 147.20,143.69 150.27,142.16 153.34,141.94 156.40,143.08 159.47,145.55 162.54,148.94 165.61,152.67 168.67,156.51 171.74,160.47 174.81,164.59 177.88,169.03 180.94,173.98 184.01,179.47 187.08,185.51 190.15,191.91 193.21,198.08 196.28,203.58 199.35,208.35 202.42,212.39 205.48,215.71 208.55,218.28 211.62,220.10 214.69,221.17 217.75,221.55 220.82,221.82 223.89,222.77 226.95,224.70 230.02,227.61 233.09,231.40 236.16,235.51 239.22,239.36 242.29,242.82 245.36,245.89 248.43,248.76 251.49,251.92 254.56,255.77 257.63,260.34 260.70,265.64 263.76,271.52 266.83,277.70 269.90,284.02 272.97,290.48 276.03,297.08 279.10,303.86 282.17,310.87 285.24,318.14 288.30,325.67 291.37,333.30 294.44,340.24 297.51,345.70 300.57,349.51 303.64,351.66 306.71,352.31 309.78,351.89 312.84,350.72 315.91,348.84 318.98,346.26 322.04,343.22 325.11,340.19 328.18,337.42 331.25,334.92 334.31,332.72 337.38,331.00 340.45,330.02 343.52,329.88 346.58,330.58 349.65,332.15 352.72,334.76 355.79,338.57 358.85,343.61 361.92,349.89 364.99,357.05 368.06,364.13 371.12,370.37 374.19,375.71 377.26,380.15 380.33,383.70 383.39,386.36 386.46,388.15 389.53,389.07 392.60,389.20 395.66,389.40 398.73,390.82 401.80,393.85 404.86,398.49 407.93,404.52 411.00,410.81 414.07,416.24 417.13,420.58 420.20,423.84 423.27,425.87 426.34,426.30 429.40,424.84 432.47,421.45 435.54,416.17 438.61,409.47 441.67,402.29 444.74,395.09 447.81,387.89 450.88,380.76 453.94,374.32 457.01,369.39 460.08,366.23 463.15,364.86 466.21,365.00 469.28,365.39 472.35,364.74 475.42,362.83 478.48,359.65 481.55,355.65 484.62,352.12 487.69,349.98 490.75,349.30 493.82,350.08 496.89,351.90 499.95,354.00 503.02,355.99 506.09,357.86 509.16,359.63 512.22,361.44 515.29,363.49 518.36,365.85 521.43,368.53 524.49,371.51 527.56,374.83 530.63,378.47 533.70,382.46 536.76,386.79 539.83,391.55 542.90,397.02 545.97,403.38 549.03,410.65 552.10,418.80 555.17,426.90 558.24,433.29 561.30,437.13 564.37,438.40 567.44,437.20 570.51,434.56 573.57,431.82 576.64,429.40 579.71,427.32 582.78,425.58 585.84,424.28 588.91,423.50 591.98,423.25 595.04,423.54 598.11,424.14 601.18,424.51 604.25,424.23 607.31,423.28 610.38,421.64 613.45,419.33 616.52,416.37 619.58,412.75 622.65,408.49 625.72,403.66 628.79,398.92 631.85,395.13 634.92,392.57 637.99,391.23 641.06,390.92 644.12,390.74 647.19,389.85 650.26,388.09 653.33,385.47 656.39,382.28 659.46,379.26 662.53,376.95 665.60,375.38 668.66,374.55 671.73,374.09 674.80,373.35 677.86,372.01 680.93,370.07 684.00,368.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,97.96 76.65,105.39 79.72,112.80 82.79,118.45 85.85,122.33 88.92,124.64 91.99,125.75 95.06,125.86 98.12,124.98 101.19,123.15 104.26,120.61 107.33,117.75 110.39,114.72 113.46,111.52 116.53,108.29 119.60,105.94 122.66,105.37 125.73,106.80 128.80,110.24 131.86,115.13 134.93,119.81 138.00,122.96 141.07,124.44 144.13,124.28 147.20,123.60 150.27,124.67 153.34,128.73 156.40,135.85 159.47,145.88 162.54,157.16 165.61,167.34 168.67,175.55 171.74,181.80 174.81,186.12 177.88,188.86 180.94,190.34 184.01,190.65 187.08,189.77 190.15,188.07 193.21,186.64 196.28,186.31 199.35,187.18 202.42,189.24 205.48,192.30 208.55,196.00 211.62,200.14 214.69,204.70 217.75,209.66 220.82,214.76 223.89,219.60 226.95,224.04 230.02,228.10 233.09,231.81 236.16,235.46 239.22,239.33 242.29,243.49 245.36,247.94 248.43,252.65 251.49,257.56 254.56,262.63 257.63,267.85 260.70,273.23 263.76,278.81 266.83,284.70 269.90,290.96 272.97,297.58 276.03,304.50 279.10,310.97 282.17,315.93 285.24,319.03 288.30,320.26 291.37,319.80 294.44,318.65 297.51,317.80 300.57,317.46 303.64,317.63 306.71,318.36 309.78,319.85 312.84,322.22 315.91,325.48 318.98,329.64 322.04,334.59 325.11,340.11 328.18,346.09 331.25,352.54 334.31,359.37 337.38,365.85 340.45,371.00 343.52,374.45 346.58,376.22 349.65,376.23 352.72,374.18 355.79,369.76 358.85,362.90 361.92,353.62 364.99,343.10 368.06,334.83 371.12,331.39 374.19,333.03 377.26,339.71 380.33,349.94 383.39,360.89 386.46,371.09 389.53,380.47 392.60,389.06 395.66,397.14 398.73,405.08 401.80,413.01 404.86,420.93 407.93,428.55 411.00,434.50 414.07,437.41 417.13,437.01 420.20,433.29 423.27,427.05 426.34,420.53 429.40,415.39 432.47,411.78 435.54,409.68 438.61,408.45 441.67,406.92 444.74,404.47 447.81,401.07 450.88,396.77 453.94,392.03 457.01,387.44 460.08,383.21 463.15,379.33 466.21,375.86 469.28,373.04 472.35,371.08 475.42,370.05 478.48,369.94 481.55,370.36 484.62,370.23 487.69,368.79 490.75,365.96 493.82,361.77 496.89,357.11 499.95,353.64 503.02,352.19 506.09,352.79 509.16,355.33 512.22,358.88 515.29,362.17 518.36,364.80 521.43,366.76 524.49,368.15 527.56,369.45 530.63,371.14 533.70,373.29 536.76,375.91 539.83,378.95 542.90,382.28 545.97,385.80 549.03,389.50 552.10,393.37 555.17,397.19 558.24,400.55 561.30,403.24 564.37,405.27 567.44,406.67 570.51,407.93 573.57,409.66 576.64,412.05 579.71,415.11 582.78,418.66 585.84,421.86 588.91,423.90 591.98,424.63 595.04,424.05 598.11,422.29 601.18,419.65 604.25,416.36 607.31,412.45 610.38,407.92 613.45,403.21 616.52,399.08 619.58,395.89 622.65,393.68 625.72,392.45 628.79,392.32 631.85,393.48 634.92,395.97 637.99,399.80 641.06,404.74 644.12,409.86 647.19,414.25 650.26,417.75 653.33,420.36 656.39,422.30 659.46,424.16 662.53,426.34 665.60,428.89 668.66,431.78 671.73,434.67 674.80,436.98 677.86,438.41 680.93,438.95 684.00,438.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,141.00 76.65,147.07 79.72,153.11 82.79,157.72 85.85,160.88 88.92,162.50 91.99,162.34 95.06,160.31 98.12,156.37 101.19,150.65 104.26,144.30 107.33,139.03 110.39,135.47 113.46,133.61 116.53,133.29 119.60,133.50 122.66,133.17 125.73,132.07 128.80,130.20 131.86,127.68 134.93,124.91 138.00,122.20 141.07,119.56 144.13,117.03 147.20,115.14 150.27,114.95 153.34,117.07 156.40,121.53 159.47,128.23 162.54,136.23 165.61,144.15 168.67,151.50 171.74,158.28 174.81,164.39 177.88,169.32 180.94,172.55 184.01,173.96 187.08,173.55 190.15,171.75 193.21,169.89 196.28,168.97 199.35,169.11 202.42,170.32 205.48,172.64 208.55,176.20 211.62,181.04 214.69,187.18 217.75,194.58 220.82,202.86 223.89,211.49 226.95,220.28 230.02,229.23 233.09,238.23 236.16,246.72 239.22,254.11 242.29,260.27 245.36,265.20 248.43,269.18 251.49,273.00 254.56,277.26 257.63,282.04 260.70,287.33 263.76,292.99 266.83,298.75 269.90,304.44 272.97,310.08 276.03,315.59 279.10,320.39 282.17,323.66 285.24,325.10 288.30,324.72 291.37,322.87 294.44,321.49 297.51,322.52 300.57,326.37 303.64,333.02 306.71,341.56 309.78,349.20 312.84,353.87 315.91,355.35 318.98,353.70 322.04,350.13 325.11,347.04 328.18,345.71 331.25,346.18 334.31,348.38 337.38,351.48 340.45,354.36 343.52,356.62 346.58,358.26 349.65,359.28 352.72,359.65 355.79,359.32 358.85,358.29 361.92,356.56 364.99,354.53 368.06,353.37 371.12,353.93 374.19,356.31 377.26,360.47 380.33,365.79 383.39,371.08 386.46,375.71 389.53,379.66 392.60,382.95 395.66,385.81 398.73,388.54 401.80,391.24 404.86,393.91 407.93,396.53 411.00,398.93 414.07,400.98 417.13,402.64 420.20,403.91 423.27,404.84 426.34,405.59 429.40,406.28 432.47,406.92 435.54,407.49 438.61,407.74 441.67,407.18 444.74,405.57 447.81,402.89 450.88,399.22 453.94,395.26 457.01,391.95 460.08,389.59 463.15,388.18 466.21,387.53 469.28,386.63 472.35,384.50 475.42,380.96 478.48,376.00 481.55,369.91 484.62,363.54 487.69,357.47 490.75,351.77 493.82,346.46 496.89,342.09 499.95,339.69 503.02,339.79 506.09,342.40 509.16,347.39 512.22,353.57 515.29,359.38 518.36,364.28 521.43,368.27 524.49,371.50 527.56,374.58 530.63,378.10 533.70,382.19 536.76,386.85 539.83,392.11 542.90,398.10 545.97,404.88 549.03,412.47 552.10,420.82 555.17,429.01 558.24,435.30 561.30,438.85 564.37,439.63 567.44,437.79 570.51,434.70 573.57,432.16 576.64,430.73 579.71,430.43 582.78,431.14 585.84,432.40 588.91,433.74 591.98,435.08 595.04,436.42 598.11,437.59 601.18,438.15 604.25,437.80 607.31,436.50 610.38,434.26 613.45,431.05 616.52,426.83 619.58,421.59 622.65,415.33 625.72,408.15 628.79,401.02 631.85,395.15 634.92,390.95 637.99,388.40 641.06,387.41 644.12,387.51 647.19,388.26 650.26,389.58 653.33,391.46 656.39,393.66 659.46,395.47 662.53,396.44 665.60,396.50 668.66,395.69 671.73,394.28 674.80,392.82 677.86,391.54 680.93,390.47 684.00,389.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,76.16 76.65,83.16 79.72,90.42 82.79,96.37 85.85,101.00 88.92,104.20 91.99,105.71 95.06,105.39 98.12,103.24 101.19,99.35 104.26,95.04 107.33,92.15 110.39,91.38 113.46,92.73 116.53,96.11 119.60,100.97 122.66,106.72 125.73,113.22 128.80,120.48 131.86,127.99 134.93,134.16 138.00,137.76 141.07,138.63 144.13,136.84 147.20,133.83 150.27,132.57 153.34,134.68 156.40,140.24 159.47,149.05 162.54,158.84 165.61,166.38 168.67,170.48 171.74,171.13 174.81,168.70 177.88,165.23 180.94,162.85 184.01,162.01 187.08,162.71 190.15,164.90 193.21,168.36 196.28,172.95 199.35,178.65 202.42,185.45 205.48,192.87 208.55,200.00 211.62,206.33 214.69,211.84 217.75,216.56 220.82,220.94 223.89,225.62 226.95,230.83 230.02,236.56 233.09,242.74 236.16,249.03 239.22,255.07 242.29,260.77 245.36,266.14 248.43,271.03 251.49,274.98 254.56,277.67 257.63,279.04 260.70,279.13 263.76,278.97 266.83,280.52 269.90,284.87 272.97,292.05 276.03,301.88 279.10,312.46 282.17,321.13 285.24,326.96 288.30,329.95 291.37,330.43 294.44,330.23 297.51,331.20 300.57,333.71 303.64,337.76 306.71,342.84 309.78,347.38 312.84,350.23 315.91,351.27 318.98,350.51 322.04,348.40 325.11,345.81 328.18,343.19 331.25,340.56 334.31,337.99 337.38,336.04 340.45,335.47 343.52,336.55 346.58,339.29 349.65,343.50 352.72,348.19 355.79,352.39 358.85,355.90 361.92,358.71 364.99,361.00 368.06,363.27 371.12,365.88 374.19,368.87 377.26,372.24 380.33,375.93 383.39,379.83 386.46,383.88 389.53,388.09 392.60,392.46 395.66,397.05 398.73,401.94 401.80,407.16 404.86,412.72 407.93,418.40 411.00,423.21 414.07,426.15 417.13,427.01 420.20,425.80 423.27,422.78 426.34,418.66 429.40,413.98 432.47,408.80 435.54,403.11 438.61,397.06 441.67,390.91 444.74,384.79 447.81,378.70 450.88,372.69 453.94,367.10 457.01,362.40 460.08,358.74 463.15,356.14 466.21,354.44 469.28,352.95 472.35,351.00 475.42,348.45 478.48,345.31 481.55,341.91 484.62,339.23 487.69,337.97 490.75,338.19 493.82,339.88 496.89,342.76 499.95,346.29 503.02,350.23 506.09,354.56 509.16,359.24 512.22,364.03 515.29,368.59 518.36,372.82 521.43,376.72 524.49,380.32 527.56,383.83 530.63,387.46 533.70,391.23 536.76,395.15 539.83,399.34 542.90,404.12 545.97,409.71 549.03,416.16 552.10,423.42 555.17,430.95 558.24,437.74 561.30,443.30 564.37,447.59 567.44,450.63 570.51,452.40 573.57,452.92 576.64,452.18 579.71,450.17 582.78,447.02 585.84,443.24 588.91,439.35 591.98,435.43 595.04,431.48 598.11,427.45 601.18,423.18 604.25,418.57 607.31,413.60 610.38,408.30 613.45,402.99 616.52,398.26 619.58,394.41 622.65,391.45 625.72,389.40 628.79,388.43 631.85,388.78 634.92,390.51 637.99,393.62 641.06,397.91 644.12,402.39 647.19,406.16 650.26,409.04 653.33,411.04 656.39,412.44 659.46,413.97 662.53,416.14 665.60,419.00 668.66,422.52 671.73,426.22 674.80,429.22 677.86,431.10 680.93,431.84 684.00,431.68 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,125.32 76.65,125.01 79.72,123.85 82.79,121.73 85.85,118.66 88.92,115.48 91.99,113.87 95.06,114.77 98.12,118.24 101.19,124.16 104.26,131.33 107.33,137.98 110.39,143.46 113.46,147.77 116.53,150.79 119.60,151.83 122.66,150.18 125.73,145.69 128.80,138.36 131.86,129.00 134.93,120.15 138.00,113.79 141.07,110.15 144.13,109.22 147.20,110.73 150.27,114.18 153.34,119.25 156.40,125.95 159.47,134.21 162.54,143.56 165.61,153.29 168.67,163.14 171.74,173.12 174.81,182.95 177.88,191.25 180.94,196.53 184.01,198.49 187.08,197.12 190.15,193.02 193.21,188.00 196.28,183.45 199.35,179.54 202.42,176.28 205.48,174.33 208.55,175.00 211.62,178.99 214.69,186.33 217.75,196.92 220.82,209.45 223.89,222.10 226.95,234.24 230.02,245.84 233.09,256.79 236.16,266.47 239.22,274.25 242.29,279.98 245.36,283.66 248.43,285.36 251.49,285.24 254.56,283.44 257.63,279.98 260.70,274.90 263.76,269.35 266.83,265.63 269.90,264.95 272.97,267.38 276.03,272.81 279.10,280.09 282.17,287.66 285.24,294.95 288.30,301.96 291.37,308.60 294.44,314.37 297.51,318.76 300.57,321.67 303.64,323.11 306.71,323.52 309.78,324.20 312.84,326.16 315.91,329.48 318.98,334.16 322.04,339.78 325.11,345.51 328.18,350.92 331.25,355.99 334.31,360.65 337.38,364.20 340.45,365.69 343.52,364.79 346.58,361.49 349.65,356.14 352.72,350.57 355.79,346.59 358.85,344.57 361.92,344.51 364.99,346.49 368.06,350.73 371.12,357.40 374.19,366.51 377.26,378.00 380.33,390.52 383.39,401.45 386.46,409.43 389.53,414.40 392.60,416.46 395.66,416.55 398.73,415.93 401.80,415.05 404.86,413.91 407.93,412.51 411.00,410.90 414.07,409.13 417.13,407.20 420.20,405.11 423.27,402.83 426.34,400.26 429.40,397.31 432.47,393.97 435.54,390.28 438.61,386.61 441.67,383.72 444.74,381.99 447.81,381.44 450.88,382.00 453.94,383.12 457.01,384.08 460.08,384.62 463.15,384.75 466.21,384.37 469.28,383.09 472.35,380.51 475.42,376.56 478.48,371.25 481.55,365.13 484.62,359.82 487.69,356.47 490.75,355.20 493.82,355.97 496.89,358.31 499.95,361.28 503.02,364.43 506.09,367.73 509.16,371.19 512.22,374.74 515.29,378.31 518.36,381.89 521.43,385.46 524.49,388.93 527.56,391.82 530.63,393.69 533.70,394.43 536.76,394.06 539.83,392.85 542.90,391.57 545.97,390.77 549.03,390.48 552.10,390.72 555.17,391.32 558.24,392.01 561.30,392.63 564.37,393.19 567.44,393.69 570.51,394.23 573.57,394.92 576.64,395.80 579.71,396.88 582.78,398.03 585.84,398.75 588.91,398.52 591.98,397.27 595.04,395.00 598.11,392.44 601.18,391.61 604.25,393.92 607.31,399.51 610.38,408.29 613.45,418.91 616.52,428.91 619.58,437.07 622.65,443.35 625.72,447.78 628.79,450.59 631.85,452.09 634.92,452.39 637.99,451.47 641.06,449.54 644.12,447.48 647.19,446.15 650.26,445.68 653.33,446.08 656.39,446.95 659.46,447.23 662.53,446.18 665.60,443.74 668.66,439.94 671.73,435.29 674.80,430.71 677.86,426.64 680.93,423.10 684.00,420.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,49.45 76.65,57.57 79.72,67.21 82.79,76.81 85.85,86.39 88.92,96.00 91.99,105.79 95.06,115.84 98.12,126.16 101.19,136.67 104.26,146.63 107.33,154.99 110.39,161.33 113.46,165.66 116.53,167.99 119.60,168.45 122.66,167.16 125.73,164.15 128.80,159.42 131.86,153.19 134.93,146.14 138.00,138.81 141.07,131.26 144.13,123.52 147.20,116.44 150.27,111.72 153.34,110.32 156.40,112.27 159.47,117.47 162.54,124.49 165.61,131.36 168.67,137.33 171.74,142.41 174.81,146.74 177.88,151.11 180.94,156.35 184.01,162.65 187.08,170.00 190.15,178.06 193.21,185.73 196.28,192.17 199.35,197.30 202.42,201.14 205.48,204.05 208.55,206.82 211.62,209.85 214.69,213.18 217.75,216.80 220.82,220.72 223.89,224.95 226.95,229.49 230.02,234.36 233.09,239.41 236.16,243.94 239.22,247.26 242.29,249.19 245.36,249.76 248.43,249.39 251.49,249.43 254.56,250.90 257.63,253.92 260.70,258.48 263.76,264.52 266.83,271.91 269.90,280.60 272.97,290.57 276.03,301.73 279.10,313.03 282.17,323.00 285.24,331.12 288.30,337.40 291.37,341.87 294.44,344.73 297.51,346.17 300.57,346.23 303.64,344.93 306.71,342.33 309.78,338.69 312.84,334.19 315.91,328.87 318.98,322.75 322.04,316.75 325.11,312.66 328.18,311.42 331.25,313.07 334.31,317.50 337.38,323.68 340.45,330.16 343.52,336.44 346.58,342.53 349.65,348.42 352.72,354.16 355.79,359.77 358.85,365.27 361.92,370.65 364.99,376.00 368.06,381.55 371.12,387.47 374.19,393.79 377.26,400.48 380.33,407.00 383.39,412.27 386.46,415.75 389.53,417.41 392.60,417.32 395.66,416.07 398.73,414.47 401.80,412.79 404.86,411.04 407.93,409.20 411.00,407.18 414.07,404.91 417.13,402.38 420.20,399.58 423.27,396.61 426.34,393.74 429.40,391.14 432.47,388.86 435.54,386.87 438.61,385.20 441.67,383.86 444.74,382.87 447.81,382.20 450.88,381.84 453.94,381.39 457.01,380.31 460.08,378.44 463.15,375.77 466.21,372.44 469.28,369.10 472.35,366.41 475.42,364.48 478.48,363.31 481.55,362.72 484.62,362.17 487.69,361.30 490.75,360.07 493.82,358.49 496.89,356.98 499.95,356.31 503.02,356.87 506.09,358.68 509.16,361.69 512.22,365.36 515.29,369.01 518.36,372.41 521.43,375.57 524.49,378.48 527.56,381.18 530.63,383.69 533.70,386.04 536.76,388.21 539.83,390.44 542.90,393.37 545.97,397.44 549.03,402.70 552.10,409.11 555.17,415.96 558.24,421.92 561.30,426.33 564.37,429.16 567.44,430.47 570.51,430.59 573.57,430.01 576.64,428.86 579.71,427.16 582.78,424.99 585.84,422.77 588.91,420.93 591.98,419.54 595.04,418.59 598.11,417.84 601.18,416.64 604.25,414.50 607.31,411.40 610.38,407.37 613.45,403.31 616.52,400.83 619.58,400.74 622.65,403.04 625.72,407.63 628.79,413.46 631.85,419.17 634.92,424.33 637.99,428.94 641.06,432.97 644.12,436.32 647.19,438.87 650.26,440.61 653.33,441.53 656.39,441.63 659.46,440.84 662.53,439.15 665.60,436.55 668.66,433.06 671.73,429.36 674.80,426.61 677.86,425.37 680.93,425.67 684.00,426.97 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,117.35 76.65,118.73 79.72,119.70 82.79,119.81 85.85,119.09 88.92,118.14 91.99,118.18 95.06,119.89 98.12,123.31 101.19,128.38 104.26,134.42 107.33,140.45 110.39,146.10 113.46,151.38 116.53,156.03 119.60,158.74 122.66,158.11 125.73,153.83 128.80,145.91 131.86,135.28 134.93,124.97 138.00,117.30 141.07,112.53 144.13,110.66 147.20,111.40 150.27,114.18 153.34,118.67 156.40,124.85 159.47,132.66 162.54,141.26 165.61,149.50 168.67,156.95 171.74,163.61 174.81,169.49 177.88,174.72 180.94,179.42 184.01,183.62 187.08,187.33 190.15,190.49 193.21,193.03 196.28,194.85 199.35,195.95 202.42,196.35 205.48,196.52 208.55,197.42 211.62,199.56 214.69,202.97 217.75,207.60 220.82,212.94 223.89,218.27 226.95,223.31 230.02,228.07 233.09,232.59 236.16,237.05 239.22,241.65 242.29,246.42 245.36,251.36 248.43,256.59 251.49,262.43 254.56,269.13 257.63,276.71 260.70,285.17 263.76,293.99 266.83,302.21 269.90,309.30 272.97,315.24 276.03,320.02 279.10,323.54 282.17,325.66 285.24,326.33 288.30,325.55 291.37,323.52 294.44,321.30 297.51,319.98 300.57,319.77 303.64,320.68 306.71,322.49 309.78,324.62 312.84,326.60 315.91,328.39 318.98,330.00 322.04,331.32 325.11,332.19 328.18,332.53 331.25,332.33 334.31,331.61 337.38,330.72 340.45,330.10 343.52,329.91 346.58,330.15 349.65,330.92 352.72,332.77 355.79,336.25 358.85,341.45 361.92,348.39 364.99,356.82 368.06,366.06 371.12,375.60 374.19,385.39 377.26,395.40 380.33,405.12 383.39,413.54 386.46,420.14 389.53,424.90 392.60,427.82 395.66,428.85 398.73,427.94 401.80,425.07 404.86,420.23 407.93,413.72 411.00,406.95 414.07,401.30 417.13,397.07 420.20,394.24 423.27,392.62 426.34,391.68 429.40,391.01 432.47,390.58 435.54,390.37 438.61,389.97 441.67,388.62 444.74,385.93 447.81,381.88 450.88,376.59 453.94,371.06 457.01,366.67 460.08,363.88 463.15,362.69 466.21,362.94 469.28,363.93 472.35,364.95 475.42,365.87 478.48,366.68 481.55,367.37 484.62,367.95 487.69,368.40 490.75,368.73 493.82,368.92 496.89,369.03 499.95,369.13 503.02,369.24 506.09,369.38 509.16,369.59 512.22,370.33 515.29,372.21 518.36,375.41 521.43,379.96 524.49,385.55 527.56,390.84 530.63,394.51 533.70,396.32 536.76,396.26 539.83,394.91 542.90,393.81 545.97,394.07 549.03,395.79 552.10,398.95 555.17,403.12 558.24,407.48 561.30,411.63 564.37,415.55 567.44,419.21 570.51,422.17 573.57,423.90 576.64,424.22 579.71,423.13 582.78,420.78 585.84,417.93 588.91,415.29 591.98,413.00 595.04,411.05 598.11,409.47 601.18,408.30 604.25,407.57 607.31,407.30 610.38,407.47 613.45,407.89 616.52,408.21 619.58,408.26 622.65,408.04 625.72,407.59 628.79,407.35 631.85,407.89 634.92,409.39 637.99,411.84 641.06,415.12 644.12,418.67 647.19,421.96 650.26,424.90 653.33,427.47 656.39,429.57 659.46,430.90 662.53,431.25 665.60,430.59 668.66,428.96 671.73,426.88 674.80,425.30 677.86,424.67 680.93,425.00 684.00,425.94 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,88.20 76.65,93.08 79.72,98.06 82.79,102.02 85.85,104.96 88.92,107.32 91.99,109.96 95.06,113.38 98.12,117.60 101.19,122.59 104.26,127.99 107.33,133.28 110.39,138.26 113.46,142.93 116.53,147.14 119.60,150.05 122.66,150.77 125.73,149.11 128.80,145.08 131.86,139.24 134.93,133.45 138.00,129.13 141.07,126.44 144.13,125.39 147.20,125.94 150.27,128.01 153.34,131.56 156.40,136.59 159.47,143.00 162.54,149.66 165.61,154.96 168.67,158.32 171.74,159.72 174.81,159.45 177.88,159.00 180.94,159.93 184.01,162.59 187.08,166.96 190.15,172.54 193.21,177.74 196.28,181.36 199.35,183.26 202.42,183.47 205.48,182.81 208.55,182.94 211.62,184.76 214.69,188.32 217.75,193.59 220.82,200.44 223.89,208.66 226.95,218.16 230.02,228.95 233.09,240.72 236.16,251.80 239.22,260.47 242.29,266.38 245.36,269.51 248.43,270.43 251.49,270.79 254.56,271.84 257.63,273.73 260.70,276.44 263.76,279.90 266.83,283.93 269.90,288.42 272.97,293.39 276.03,298.78 279.10,304.21 282.17,309.11 285.24,313.30 288.30,316.76 291.37,319.59 294.44,322.20 297.51,325.02 300.57,328.14 303.64,331.56 306.71,335.20 309.78,338.79 312.84,342.17 315.91,345.29 318.98,348.18 322.04,350.84 325.11,353.30 328.18,355.60 331.25,357.72 334.31,359.66 337.38,361.30 340.45,362.48 343.52,363.14 346.58,363.29 349.65,363.02 352.72,362.84 355.79,363.27 358.85,364.41 361.92,366.25 364.99,368.45 368.06,369.98 371.12,370.07 374.19,368.66 377.26,365.76 380.33,362.17 383.39,359.37 386.46,358.14 389.53,358.51 392.60,360.44 395.66,363.62 398.73,367.59 401.80,372.20 404.86,377.45 407.93,383.13 411.00,388.16 414.07,391.48 417.13,392.87 420.20,392.34 423.27,390.52 426.34,389.18 429.40,389.62 432.47,391.99 435.54,396.23 438.61,401.42 441.67,405.82 444.74,408.53 447.81,409.50 450.88,408.80 453.94,406.82 457.01,404.12 460.08,400.89 463.15,397.12 466.21,392.90 469.28,388.65 472.35,384.77 475.42,381.34 478.48,378.35 481.55,375.79 484.62,373.59 487.69,371.71 490.75,370.15 493.82,368.90 496.89,368.06 499.95,367.79 503.02,368.19 506.09,369.25 509.16,370.95 512.22,373.14 515.29,375.58 518.36,378.21 521.43,381.02 524.49,383.94 527.56,386.57 530.63,388.54 533.70,389.77 536.76,390.27 539.83,390.16 542.90,389.80 545.97,389.46 549.03,389.14 552.10,388.87 555.17,389.03 558.24,390.29 561.30,393.01 564.37,397.20 567.44,402.71 570.51,408.31 573.57,412.36 576.64,414.36 579.71,414.29 582.78,412.53 585.84,410.76 588.91,410.61 591.98,412.37 595.04,416.03 598.11,420.90 601.18,425.03 604.25,427.09 607.31,426.95 610.38,424.64 613.45,421.11 616.52,418.03 619.58,416.24 622.65,415.75 625.72,416.50 628.79,417.84 631.85,418.96 634.92,419.57 637.99,419.70 641.06,419.40 644.12,419.02 647.19,418.88 650.26,419.04 653.33,419.49 656.39,420.06 659.46,420.23 662.53,419.67 665.60,418.35 668.66,416.29 671.73,413.94 674.80,412.11 677.86,411.19 680.93,411.19 684.00,411.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,101.62 76.65,105.77 79.72,110.39 82.79,114.60 85.85,118.41 88.92,121.96 91.99,125.52 95.06,129.26 98.12,133.19 101.19,137.25 104.26,140.94 107.33,143.51 110.39,144.69 113.46,144.47 116.53,142.95 119.60,140.65 122.66,138.13 125.73,135.50 128.80,132.77 131.86,130.08 134.93,127.83 138.00,126.35 141.07,125.67 144.13,125.80 147.20,126.65 150.27,128.05 153.34,129.92 156.40,132.24 159.47,135.02 162.54,138.23 165.61,141.83 168.67,145.81 171.74,150.17 174.81,154.91 177.88,160.06 180.94,165.65 184.01,171.69 187.08,178.18 190.15,184.85 193.21,190.91 196.28,195.76 199.35,199.31 202.42,201.60 205.48,203.16 208.55,205.06 211.62,207.88 214.69,211.64 217.75,216.27 220.82,220.85 223.89,224.09 226.95,225.52 230.02,225.14 233.09,223.26 236.16,221.49 239.22,221.48 242.29,223.60 245.36,227.85 248.43,234.18 251.49,242.48 254.56,252.66 257.63,264.73 260.70,278.62 263.76,293.26 266.83,306.48 269.90,317.12 272.97,325.13 276.03,330.55 279.10,333.79 282.17,335.46 285.24,335.74 288.30,334.65 291.37,332.32 294.44,329.49 297.51,326.92 300.57,324.75 303.64,322.99 306.71,321.96 309.78,322.62 312.84,325.70 315.91,331.27 318.98,339.27 322.04,348.48 325.11,356.47 328.18,361.97 331.25,364.91 334.31,365.39 337.38,364.26 340.45,362.70 343.52,361.12 346.58,359.51 349.65,358.03 352.72,357.42 355.79,358.42 358.85,361.17 361.92,365.68 364.99,371.48 368.06,377.21 371.12,381.89 374.19,385.41 377.26,387.76 380.33,389.12 383.39,389.76 386.46,389.84 389.53,389.36 392.60,388.43 395.66,387.89 398.73,388.91 401.80,391.89 404.86,396.82 407.93,403.30 411.00,409.25 414.07,412.62 417.13,413.00 420.20,410.39 423.27,405.11 426.34,398.09 429.40,389.97 432.47,380.84 435.54,370.76 438.61,361.31 441.67,355.45 444.74,354.71 447.81,359.16 450.88,368.40 453.94,378.85 457.01,385.67 460.08,387.27 463.15,383.62 466.21,375.37 469.28,365.57 472.35,357.22 475.42,350.92 478.48,346.66 481.55,344.40 484.62,344.09 487.69,345.65 490.75,349.09 493.82,354.38 496.89,360.95 499.95,367.76 503.02,374.26 506.09,380.45 509.16,386.30 512.22,391.72 515.29,396.57 518.36,400.82 521.43,404.46 524.49,407.41 527.56,409.35 530.63,409.94 533.70,409.13 536.76,406.91 539.83,403.71 542.90,400.69 545.97,398.66 549.03,397.72 552.10,397.85 555.17,398.91 558.24,400.64 561.30,402.89 564.37,405.66 567.44,408.92 570.51,412.32 573.57,415.40 576.64,418.02 579.71,420.18 582.78,421.85 585.84,422.88 588.91,423.12 591.98,422.55 595.04,421.18 598.11,419.18 601.18,417.01 604.25,415.02 607.31,413.22 610.38,411.63 613.45,410.30 616.52,409.29 619.58,408.67 622.65,408.42 625.72,408.48 628.79,408.38 631.85,407.45 634.92,405.50 637.99,402.54 641.06,398.77 644.12,395.17 647.19,392.68 650.26,391.47 653.33,391.54 656.39,392.79 659.46,394.99 662.53,397.98 665.60,401.74 668.66,406.25 671.73,410.97 674.80,414.92 677.86,417.66 680.93,419.15 684.00,419.55 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,75.26 76.65,78.93 79.72,84.75 82.79,92.33 85.85,101.65 88.92,112.04 91.99,122.13 95.06,131.14 98.12,139.03 101.19,145.81 104.26,151.62 107.33,156.67 110.39,161.04 113.46,164.73 116.53,167.59 119.60,168.87 122.66,167.74 125.73,164.04 128.80,157.76 131.86,149.44 134.93,140.76 138.00,133.03 141.07,126.41 144.13,120.89 147.20,116.70 150.27,114.27 153.34,113.82 156.40,115.38 159.47,118.91 162.54,124.15 165.61,130.71 168.67,138.44 171.74,147.35 174.81,157.28 177.88,167.45 180.94,177.02 184.01,185.80 187.08,193.82 190.15,200.78 193.21,205.85 196.28,208.38 199.35,208.31 202.42,205.68 205.48,201.83 208.55,199.40 211.62,199.86 214.69,203.26 217.75,209.53 220.82,217.68 223.89,226.37 226.95,235.10 230.02,243.87 233.09,252.46 236.16,259.67 239.22,264.30 242.29,266.09 245.36,265.03 248.43,261.71 251.49,257.88 254.56,254.89 257.63,252.86 260.70,251.84 263.76,252.56 266.83,256.46 269.90,264.33 272.97,276.19 276.03,291.78 279.10,308.26 282.17,321.70 285.24,330.70 288.30,335.25 291.37,335.69 294.44,333.82 297.51,331.42 300.57,328.89 303.64,326.22 306.71,323.68 309.78,322.05 312.84,321.91 315.91,323.34 318.98,326.32 322.04,330.47 325.11,335.09 328.18,339.79 331.25,344.55 334.31,349.34 337.38,353.83 340.45,357.55 343.52,360.34 346.58,362.20 349.65,363.28 352.72,364.28 355.79,365.94 358.85,368.40 361.92,371.66 364.99,375.27 368.06,377.91 371.12,378.60 374.19,377.26 377.26,373.91 380.33,369.82 383.39,367.33 386.46,367.70 389.53,370.97 392.60,376.94 395.66,383.57 398.73,388.11 401.80,389.64 404.86,388.14 407.93,384.14 411.00,380.28 414.07,379.15 417.13,381.29 420.20,386.67 423.27,394.34 426.34,401.51 429.40,406.15 432.47,408.07 435.54,407.27 438.61,404.30 441.67,400.14 444.74,395.31 447.81,389.83 450.88,383.78 453.94,378.06 457.01,373.84 460.08,371.51 463.15,371.07 466.21,372.26 469.28,373.84 472.35,374.56 475.42,374.20 478.48,372.76 481.55,370.64 484.62,369.01 487.69,368.70 490.75,369.80 493.82,372.29 496.89,375.64 499.95,378.89 503.02,381.56 506.09,383.63 509.16,385.13 512.22,386.41 515.29,387.90 518.36,389.75 521.43,391.98 524.49,394.52 527.56,397.19 530.63,399.78 533.70,402.26 536.76,404.62 539.83,406.78 542.90,408.44 545.97,409.42 549.03,409.69 552.10,409.28 555.17,408.74 558.24,409.11 561.30,410.88 564.37,414.08 567.44,418.56 570.51,423.01 573.57,425.70 576.64,426.09 579.71,424.17 582.78,420.29 585.84,415.98 588.91,412.76 591.98,410.90 595.04,410.38 598.11,410.94 601.18,411.81 604.25,412.45 607.31,412.82 610.38,412.90 613.45,412.51 616.52,411.34 619.58,409.23 622.65,406.17 625.72,402.29 628.79,398.62 631.85,396.52 634.92,396.41 637.99,398.29 641.06,401.93 644.12,406.23 647.19,410.16 650.26,413.53 653.33,416.35 656.39,418.71 659.46,420.87 662.53,423.01 665.60,425.14 668.66,427.24 671.73,429.13 674.80,430.45 677.86,431.02 680.93,430.85 684.00,430.19 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,119.99 76.65,122.53 79.72,124.56 82.79,125.35 85.85,124.92 88.92,123.73 91.99,122.73 95.06,122.47 98.12,122.95 101.19,124.17 104.26,125.87 107.33,127.67 110.39,129.43 113.46,131.16 116.53,132.86 119.60,134.54 122.66,136.20 125.73,137.86 128.80,139.50 131.86,141.18 134.93,143.03 138.00,145.13 141.07,147.51 144.13,150.16 147.20,152.82 150.27,154.99 153.34,156.38 156.40,156.97 159.47,156.83 162.54,156.71 165.61,157.66 168.67,160.05 171.74,163.90 174.81,168.91 177.88,173.43 180.94,175.78 184.01,175.57 187.08,172.81 190.15,168.18 193.21,163.72 196.28,161.02 199.35,160.25 202.42,161.43 205.48,164.76 208.55,170.65 211.62,179.34 214.69,190.83 217.75,204.97 220.82,220.12 223.89,233.96 226.95,245.68 230.02,255.27 233.09,262.67 236.16,267.66 239.22,270.00 242.29,269.66 245.36,266.62 248.43,261.63 251.49,256.94 254.56,254.26 257.63,253.77 260.70,255.46 263.76,258.92 266.83,263.36 269.90,268.34 272.97,273.86 276.03,279.92 279.10,286.61 282.17,294.09 285.24,302.40 288.30,311.54 291.37,321.29 294.44,330.47 297.51,337.91 300.57,343.35 303.64,346.81 306.71,348.63 309.78,349.89 312.84,351.37 315.91,353.17 318.98,355.27 322.04,357.34 325.11,358.75 328.18,359.16 331.25,358.55 334.31,356.97 337.38,354.81 340.45,352.64 343.52,350.64 346.58,348.82 349.65,347.23 352.72,346.11 355.79,345.72 358.85,346.10 361.92,347.27 364.99,349.23 368.06,352.03 371.12,355.68 374.19,360.20 377.26,365.56 380.33,371.43 383.39,377.16 386.46,382.40 389.53,387.14 392.60,391.40 395.66,395.46 398.73,399.69 401.80,404.22 404.86,409.04 407.93,414.03 411.00,418.57 414.07,422.06 417.13,424.36 420.20,425.49 423.27,425.34 426.34,423.69 429.40,420.33 432.47,415.25 435.54,408.48 438.61,400.55 441.67,392.47 444.74,384.75 447.81,377.42 450.88,370.54 453.94,364.73 457.01,360.85 460.08,359.15 463.15,359.65 466.21,362.12 469.28,365.44 472.35,368.50 475.42,371.11 478.48,373.25 481.55,374.69 484.62,374.79 487.69,373.06 490.75,369.47 493.82,364.06 496.89,357.96 499.95,353.25 503.02,351.00 506.09,351.25 509.16,353.91 512.22,358.30 515.29,363.48 518.36,369.14 521.43,375.29 524.49,381.83 527.56,388.33 530.63,394.37 533.70,399.87 536.76,404.84 539.83,409.23 542.90,412.93 545.97,415.88 549.03,418.05 552.10,419.45 555.17,419.72 558.24,418.26 561.30,414.77 564.37,409.22 567.44,401.84 570.51,394.47 573.57,389.55 576.64,387.86 579.71,389.40 582.78,393.83 585.84,399.60 588.91,405.19 591.98,410.33 595.04,415.01 598.11,418.97 601.18,421.43 604.25,421.88 607.31,420.26 610.38,416.63 613.45,412.06 616.52,408.50 619.58,406.92 622.65,407.35 625.72,409.63 628.79,412.35 631.85,413.72 634.92,413.15 637.99,410.65 641.06,406.56 644.12,402.39 647.19,399.60 650.26,398.44 653.33,398.91 656.39,400.93 659.46,404.27 662.53,408.78 665.60,414.44 668.66,421.21 671.73,427.95 674.80,432.64 677.86,434.33 680.93,432.98 684.00,429.75 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,125.07 76.65,121.08 79.72,118.65 82.79,119.08 85.85,122.33 88.92,127.67 91.99,133.56 95.06,139.15 98.12,144.39 101.19,149.24 104.26,153.13 107.33,155.27 110.39,155.37 113.46,153.41 116.53,149.64 119.60,145.45 122.66,142.30 125.73,140.49 128.80,140.04 131.86,140.45 134.93,140.14 138.00,137.90 141.07,133.59 144.13,127.26 147.20,120.24 150.27,115.22 153.34,113.70 156.40,115.75 159.47,121.27 162.54,129.07 165.61,137.48 168.67,145.88 171.74,154.27 174.81,162.52 177.88,169.94 180.94,175.79 184.01,179.93 187.08,182.37 190.15,183.55 193.21,184.90 196.28,187.50 199.35,191.49 202.42,196.83 205.48,203.04 208.55,209.11 211.62,214.49 214.69,219.16 217.75,223.13 220.82,226.49 223.89,229.36 226.95,231.80 230.02,233.80 233.09,235.47 236.16,237.37 239.22,240.06 242.29,243.68 245.36,248.21 248.43,253.41 251.49,258.51 254.56,262.92 257.63,266.60 260.70,269.53 263.76,272.01 266.83,274.58 269.90,277.51 272.97,280.83 276.03,284.54 279.10,288.62 282.17,293.06 285.24,297.84 288.30,302.97 291.37,308.41 294.44,314.00 297.51,319.56 300.57,325.05 303.64,330.48 306.71,335.69 309.78,340.21 312.84,343.70 315.91,346.12 318.98,347.49 322.04,348.33 325.11,349.65 328.18,351.96 331.25,355.31 334.31,359.62 337.38,364.26 340.45,368.34 343.52,371.57 346.58,373.95 349.65,375.38 352.72,375.49 355.79,373.86 358.85,370.42 361.92,365.17 364.99,358.78 368.06,353.20 371.12,349.85 374.19,348.89 377.26,350.33 380.33,354.00 383.39,359.66 386.46,367.17 389.53,376.51 392.60,387.56 395.66,399.02 398.73,409.14 401.80,417.33 404.86,423.57 407.93,427.95 411.00,430.87 414.07,432.72 417.13,433.58 420.20,433.45 423.27,432.21 426.34,429.50 429.40,425.07 432.47,418.89 435.54,410.98 438.61,402.06 441.67,393.43 444.74,385.76 447.81,379.09 450.88,373.41 453.94,368.65 457.01,364.73 460.08,361.61 463.15,359.30 466.21,357.74 469.28,356.62 472.35,355.67 475.42,354.81 478.48,354.06 481.55,353.52 484.62,353.49 487.69,354.20 490.75,355.67 493.82,357.88 496.89,360.81 499.95,364.38 503.02,368.54 506.09,373.30 509.16,378.55 512.22,383.43 515.29,386.79 518.36,388.24 521.43,387.78 524.49,385.68 527.56,383.16 530.63,381.41 533.70,380.65 536.76,380.89 539.83,382.06 542.90,384.04 545.97,386.71 549.03,390.06 552.10,394.08 555.17,398.63 558.24,403.41 561.30,408.27 564.37,413.21 567.44,418.22 570.51,423.10 573.57,427.62 576.64,431.70 579.71,435.35 582.78,438.50 585.84,440.85 588.91,442.12 591.98,442.25 595.04,441.26 598.11,439.13 601.18,435.86 604.25,431.44 607.31,425.87 610.38,419.20 613.45,412.23 616.52,406.46 619.58,402.62 622.65,400.72 625.72,400.65 628.79,401.22 631.85,400.94 634.92,399.35 637.99,396.43 641.06,392.49 644.12,388.96 647.19,387.17 650.26,387.36 653.33,389.52 656.39,393.12 659.46,396.70 662.53,399.24 665.60,400.67 668.66,400.99 671.73,400.50 674.80,399.74 677.86,398.96 680.93,398.17 684.00,397.51 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,130.05 76.65,135.83 79.72,141.06 82.79,144.28 85.85,145.50 88.92,145.24 91.99,144.57 95.06,144.09 98.12,143.84 101.19,143.86 104.26,144.65 107.33,146.97 110.39,151.09 113.46,157.01 116.53,164.36 119.60,171.03 122.66,174.84 125.73,175.29 128.80,172.39 131.86,166.76 134.93,160.40 138.00,154.86 141.07,150.32 144.13,146.77 147.20,143.83 150.27,140.74 153.34,137.10 156.40,132.88 159.47,128.21 162.54,124.39 165.61,123.33 168.67,125.70 171.74,131.52 174.81,140.39 177.88,150.18 180.94,158.68 184.01,165.39 187.08,170.33 190.15,174.01 193.21,178.00 196.28,183.53 199.35,190.72 202.42,199.56 205.48,209.49 208.55,219.40 211.62,228.67 214.69,237.27 217.75,245.15 220.82,251.55 223.89,255.43 226.95,256.42 230.02,254.52 233.09,250.05 236.16,244.74 239.22,240.36 242.29,237.29 245.36,235.53 248.43,235.16 251.49,236.48 254.56,239.68 257.63,244.79 260.70,251.77 263.76,259.75 266.83,267.01 269.90,272.62 272.97,276.54 276.03,278.92 279.10,281.30 282.17,285.82 285.24,293.24 288.30,303.58 291.37,316.35 294.44,329.11 297.51,339.37 300.57,346.61 303.64,350.84 306.71,352.65 309.78,353.84 312.84,355.71 315.91,358.43 318.98,361.97 322.04,365.81 325.11,368.94 328.18,370.83 331.25,371.44 334.31,370.80 337.38,369.05 340.45,366.37 343.52,362.85 346.58,358.47 349.65,353.40 352.72,348.40 355.79,344.25 358.85,341.11 361.92,338.98 364.99,338.01 368.06,338.66 371.12,341.27 374.19,345.86 377.26,352.40 380.33,360.17 383.39,367.76 386.46,374.42 389.53,380.14 392.60,384.92 395.66,388.95 398.73,392.46 401.80,395.54 404.86,398.19 407.93,400.48 411.00,402.78 414.07,405.46 417.13,408.59 420.20,412.18 423.27,415.91 426.34,418.86 429.40,420.39 432.47,420.43 435.54,418.98 438.61,416.09 441.67,411.87 444.74,406.37 447.81,399.60 450.88,391.62 453.94,383.04 457.01,374.72 460.08,366.91 463.15,359.63 466.21,352.90 469.28,346.88 472.35,341.74 475.42,337.49 478.48,334.14 481.55,332.02 484.62,332.04 487.69,334.88 490.75,340.58 493.82,349.10 496.89,359.19 499.95,368.52 503.02,375.90 506.09,381.30 509.16,384.78 512.22,386.84 515.29,388.17 518.36,388.99 521.43,389.30 524.49,389.24 527.56,389.45 530.63,390.56 533.70,392.67 536.76,395.78 539.83,399.56 542.90,403.04 545.97,405.57 549.03,407.06 552.10,407.54 555.17,407.37 558.24,407.17 561.30,407.29 564.37,407.72 567.44,408.45 570.51,409.33 573.57,410.14 576.64,410.81 579.71,411.35 582.78,411.94 585.84,413.39 588.91,416.50 591.98,421.41 595.04,428.12 598.11,435.85 601.18,442.54 604.25,446.72 607.31,448.26 610.38,447.18 613.45,444.15 616.52,440.34 619.58,436.33 622.65,432.14 625.72,427.77 628.79,423.20 631.85,418.42 634.92,413.41 637.99,408.17 641.06,402.77 644.12,397.49 647.19,392.60 650.26,388.15 653.33,384.15 656.39,380.74 659.46,378.34 662.53,377.24 665.60,377.46 668.66,378.98 671.73,381.43 674.80,384.15 677.86,386.83 680.93,389.44 684.00,391.60 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,90.61 76.65,91.20 79.72,91.63 82.79,91.72 85.85,91.51 88.92,91.73 91.99,93.92 95.06,98.93 98.12,106.83 101.19,117.42 104.26,128.82 107.33,138.29 110.39,144.80 113.46,148.35 116.53,149.17 119.60,148.64 122.66,148.21 125.73,148.20 128.80,148.60 131.86,149.23 134.93,149.51 138.00,148.98 141.07,147.60 144.13,145.37 147.20,142.82 150.27,140.97 153.34,140.41 156.40,141.15 159.47,143.16 162.54,146.06 165.61,149.30 168.67,152.67 171.74,156.18 174.81,159.86 177.88,163.94 180.94,168.66 184.01,174.09 187.08,180.20 190.15,186.55 193.21,191.72 196.28,194.61 199.35,195.10 202.42,193.25 205.48,190.34 208.55,188.98 211.62,190.58 214.69,195.21 217.75,202.74 220.82,211.73 223.89,220.15 226.95,227.29 230.02,233.15 233.09,237.85 236.16,242.20 239.22,246.99 242.29,252.40 245.36,258.42 248.43,264.81 251.49,270.84 254.56,275.94 257.63,280.06 260.70,283.20 263.76,285.72 266.83,288.28 269.90,291.26 272.97,294.66 276.03,298.49 279.10,302.61 282.17,306.88 285.24,311.24 288.30,315.67 291.37,320.05 294.44,323.56 297.51,325.42 300.57,325.46 303.64,323.69 306.71,320.85 309.78,319.20 312.84,320.42 315.91,324.70 318.98,331.97 322.04,341.17 325.11,350.15 328.18,357.81 331.25,364.09 334.31,368.96 337.38,372.18 340.45,373.40 343.52,372.49 346.58,369.47 349.65,364.53 352.72,358.72 355.79,353.09 358.85,347.84 361.92,342.99 364.99,338.72 368.06,335.61 371.12,334.07 374.19,334.15 377.26,335.86 380.33,339.42 383.39,345.24 386.46,353.54 389.53,364.32 392.60,377.39 395.66,390.74 398.73,401.68 401.80,409.27 404.86,413.52 407.93,414.76 411.00,414.70 414.07,415.01 417.13,416.04 420.20,417.79 423.27,420.04 426.34,422.18 429.40,423.77 432.47,424.76 435.54,425.14 438.61,424.47 441.67,421.97 444.74,417.21 447.81,410.18 450.88,400.99 453.94,390.62 457.01,380.39 460.08,370.75 463.15,361.69 466.21,353.27 469.28,345.80 472.35,339.55 475.42,334.57 478.48,330.87 481.55,328.53 484.62,327.77 487.69,328.75 490.75,331.48 493.82,335.96 496.89,341.82 499.95,348.40 503.02,355.38 506.09,362.73 509.16,370.41 512.22,378.05 515.29,385.12 518.36,391.47 521.43,397.08 524.49,401.93 527.56,405.86 530.63,408.70 533.70,410.44 536.76,411.07 539.83,410.84 542.90,410.45 545.97,410.38 549.03,410.69 552.10,411.36 555.17,412.19 558.24,412.79 561.30,412.97 564.37,412.71 567.44,412.07 570.51,411.39 573.57,411.11 576.64,411.39 579.71,412.22 582.78,413.55 585.84,415.08 588.91,416.54 591.98,417.88 595.04,419.11 598.11,420.28 601.18,421.58 604.25,423.14 607.31,424.97 610.38,427.06 613.45,429.00 616.52,430.12 619.58,430.05 622.65,428.80 625.72,426.45 628.79,423.76 631.85,421.72 634.92,420.65 637.99,420.54 641.06,421.20 644.12,421.78 647.19,421.46 650.26,420.10 653.33,417.70 656.39,414.45 659.46,410.90 662.53,407.40 665.60,403.99 668.66,400.67 671.73,397.46 674.80,394.36 677.86,391.38 680.93,388.52 684.00,386.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,121.41 76.65,132.12 79.72,141.48 82.79,146.65 85.85,147.67 88.92,145.20 91.99,140.67 95.06,134.85 98.12,127.78 101.19,119.61 104.26,111.90 107.33,106.89 110.39,105.43 113.46,107.53 116.53,112.88 119.60,119.84 122.66,126.64 125.73,132.89 128.80,138.61 131.86,143.87 134.93,148.95 138.00,154.05 141.07,159.20 144.13,164.37 147.20,168.89 150.27,171.38 153.34,171.09 156.40,167.97 159.47,162.21 162.54,155.83 165.61,151.72 168.67,150.94 171.74,153.49 174.81,158.90 177.88,164.55 180.94,167.70 184.01,167.76 187.08,164.75 190.15,159.68 193.21,155.76 196.28,155.43 199.35,158.97 202.42,166.36 205.48,176.80 208.55,188.76 211.62,201.38 214.69,214.62 217.75,228.32 220.82,240.79 223.89,249.66 226.95,254.06 230.02,253.99 233.09,250.02 236.16,245.25 239.22,242.85 242.29,243.50 245.36,247.19 248.43,253.33 251.49,260.07 254.56,266.03 257.63,271.06 260.70,275.16 263.76,278.55 266.83,281.62 269.90,284.59 272.97,287.47 276.03,290.31 279.10,293.59 282.17,297.98 285.24,303.71 288.30,310.79 291.37,319.01 294.44,327.30 297.51,334.56 300.57,340.55 303.64,345.29 306.71,348.82 309.78,351.29 312.84,352.81 315.91,353.40 318.98,353.05 322.04,351.97 325.11,350.53 328.18,348.94 331.25,347.19 334.31,345.31 337.38,343.30 340.45,341.21 343.52,339.05 346.58,336.81 349.65,334.71 352.72,333.86 355.79,335.36 358.85,339.44 361.92,346.08 364.99,354.71 368.06,363.59 371.12,371.47 374.19,378.20 377.26,383.80 380.33,388.51 383.39,392.78 386.46,396.85 389.53,400.73 392.60,404.40 395.66,407.63 398.73,410.11 401.80,411.72 404.86,412.48 407.93,412.43 411.00,411.90 414.07,411.18 417.13,410.36 420.20,409.41 423.27,408.24 426.34,406.53 429.40,404.06 432.47,400.80 435.54,396.77 438.61,392.21 441.67,387.61 444.74,383.22 447.81,379.04 450.88,375.08 453.94,371.34 457.01,367.85 460.08,364.59 463.15,361.58 466.21,358.93 469.28,357.21 472.35,356.98 475.42,358.34 478.48,361.30 481.55,365.32 484.62,368.93 487.69,371.06 490.75,371.61 493.82,370.60 496.89,368.67 499.95,367.02 503.02,366.24 506.09,366.36 509.16,367.40 512.22,369.53 515.29,372.97 518.36,377.81 521.43,384.04 524.49,391.34 527.56,398.19 530.63,403.11 533.70,405.83 536.76,406.36 539.83,405.18 542.90,403.67 545.97,402.83 549.03,402.74 552.10,403.39 555.17,404.40 558.24,405.07 561.30,405.05 564.37,404.34 567.44,402.99 570.51,401.50 573.57,400.52 576.64,400.25 579.71,400.70 582.78,401.88 585.84,403.88 588.91,406.78 591.98,410.57 595.04,415.27 598.11,420.44 601.18,424.87 604.25,427.74 607.31,428.97 610.38,428.57 613.45,426.88 616.52,424.51 619.58,421.75 622.65,418.61 625.72,415.10 628.79,411.31 631.85,407.35 634.92,403.25 637.99,399.02 641.06,394.84 644.12,391.62 647.19,390.22 650.26,390.77 653.33,393.28 656.39,396.92 659.46,399.49 662.53,399.44 665.60,396.66 668.66,391.20 671.73,384.24 674.80,377.89 677.86,373.18 680.93,370.15 684.00,368.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,73.77 76.65,74.76 79.72,77.03 82.79,80.64 85.85,85.57 88.92,91.72 91.99,98.80 95.06,106.68 98.12,115.35 101.19,124.74 104.26,133.96 107.33,141.78 110.39,147.73 113.46,151.79 116.53,154.04 119.60,154.86 122.66,154.64 125.73,153.48 128.80,151.38 131.86,148.46 134.93,145.17 138.00,141.83 141.07,138.49 144.13,135.14 147.20,131.98 150.27,129.34 153.34,127.43 156.40,126.26 159.47,125.86 162.54,126.61 165.61,129.04 168.67,133.36 171.74,139.55 174.81,147.51 177.88,156.56 180.94,166.01 184.01,175.71 187.08,185.67 190.15,195.29 193.21,202.82 196.28,206.90 199.35,207.36 202.42,204.26 205.48,199.11 208.55,194.88 211.62,193.22 214.69,194.19 217.75,197.74 220.82,203.21 223.89,209.66 226.95,216.75 230.02,224.48 233.09,232.82 236.16,241.55 239.22,250.46 242.29,259.50 245.36,268.67 248.43,277.47 251.49,284.34 254.56,288.13 257.63,288.71 260.70,286.15 263.76,282.33 266.83,280.95 269.90,284.02 272.97,291.61 276.03,303.49 279.10,317.00 282.17,328.49 285.24,336.67 288.30,341.52 291.37,343.32 294.44,343.43 297.51,343.26 300.57,343.11 303.64,342.96 306.71,342.61 309.78,341.43 312.84,338.93 315.91,335.07 318.98,329.87 322.04,324.05 325.11,318.96 328.18,315.35 331.25,313.23 334.31,312.64 337.38,313.85 340.45,317.21 343.52,322.86 346.58,330.80 349.65,340.60 352.72,350.13 355.79,357.24 358.85,361.51 361.92,362.92 364.99,362.04 368.06,360.46 371.12,359.38 374.19,358.92 377.26,359.09 380.33,360.42 383.39,363.90 386.46,370.02 389.53,378.83 392.60,390.13 395.66,402.06 398.73,412.12 401.80,419.45 404.86,424.04 407.93,426.09 411.00,426.52 414.07,426.25 417.13,425.47 420.20,424.19 423.27,422.31 426.34,419.60 429.40,415.90 432.47,411.18 435.54,405.47 438.61,399.00 441.67,392.28 444.74,385.55 447.81,378.81 450.88,372.15 453.94,366.27 457.01,362.12 460.08,360.03 463.15,360.00 466.21,361.83 469.28,364.65 472.35,367.57 475.42,370.43 478.48,373.22 481.55,375.76 484.62,377.51 487.69,378.10 490.75,377.48 493.82,375.69 496.89,373.25 499.95,371.19 503.02,370.00 506.09,369.70 509.16,370.27 512.22,371.42 515.29,372.77 518.36,374.20 521.43,375.71 524.49,377.32 527.56,379.17 530.63,381.37 533.70,383.96 536.76,386.94 539.83,390.41 542.90,394.69 545.97,400.02 549.03,406.40 552.10,413.81 555.17,421.46 558.24,427.93 561.30,432.51 564.37,435.17 567.44,435.94 570.51,434.99 573.57,432.56 576.64,428.73 579.71,423.50 582.78,417.17 585.84,411.15 588.91,406.79 591.98,404.35 595.04,403.81 598.11,404.97 601.18,407.28 604.25,410.32 607.31,414.07 610.38,418.49 613.45,422.87 616.52,425.93 619.58,427.04 622.65,426.18 625.72,423.39 628.79,419.02 631.85,413.51 634.92,407.02 637.99,399.54 641.06,391.44 644.12,384.35 647.19,379.83 650.26,378.14 653.33,379.29 656.39,382.55 659.46,385.95 662.53,388.14 665.60,388.99 668.66,388.52 671.73,386.77 674.80,383.86 677.86,379.84 680.93,374.71 684.00,369.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,111.38 76.65,107.52 79.72,103.77 82.79,101.07 85.85,99.43 88.92,99.04 91.99,100.29 95.06,103.41 98.12,108.40 101.19,115.21 104.26,123.29 107.33,131.81 110.39,140.47 113.46,149.27 116.53,157.98 119.60,165.30 122.66,169.88 125.73,171.41 128.80,169.89 131.86,165.84 134.93,160.86 138.00,156.21 141.07,152.03 144.13,148.32 147.20,145.28 150.27,143.31 153.34,142.62 156.40,143.22 159.47,145.09 162.54,147.91 165.61,151.24 168.67,154.93 171.74,158.96 174.81,163.19 177.88,166.86 180.94,169.14 184.01,169.88 187.08,169.06 190.15,167.11 193.21,165.31 196.28,164.64 199.35,165.21 202.42,167.04 205.48,170.18 208.55,174.80 211.62,180.96 214.69,188.67 217.75,197.86 220.82,207.73 223.89,217.14 226.95,225.69 230.02,233.37 233.09,240.14 236.16,245.74 239.22,249.91 242.29,252.58 245.36,253.77 248.43,253.84 251.49,253.91 254.56,254.85 257.63,256.73 260.70,259.56 263.76,263.44 266.83,268.54 269.90,274.95 272.97,282.68 276.03,291.67 279.10,301.44 282.17,311.26 285.24,320.90 288.30,330.36 291.37,339.54 294.44,347.94 297.51,355.07 300.57,360.82 303.64,365.19 306.71,368.06 309.78,369.07 312.84,367.94 315.91,364.64 318.98,359.22 322.04,352.52 325.11,346.22 328.18,341.19 331.25,337.49 334.31,335.07 337.38,333.66 340.45,332.90 343.52,332.65 346.58,332.92 349.65,333.72 352.72,335.21 355.79,337.51 358.85,340.67 361.92,344.67 364.99,349.32 368.06,354.03 371.12,358.36 374.19,362.27 377.26,365.78 380.33,369.43 383.39,374.27 386.46,380.83 389.53,389.15 392.60,399.07 395.66,409.18 398.73,417.59 401.80,423.64 404.86,427.32 407.93,428.61 411.00,427.38 414.07,423.51 417.13,416.96 420.20,407.76 423.27,396.91 426.34,387.32 429.40,381.12 432.47,378.51 435.54,379.44 438.61,382.39 441.67,384.51 444.74,384.33 447.81,381.80 450.88,377.02 453.94,371.10 457.01,365.48 460.08,360.65 463.15,356.62 466.21,353.42 469.28,351.21 472.35,350.17 475.42,350.33 478.48,351.67 481.55,353.98 484.62,356.60 487.69,359.08 490.75,361.37 493.82,363.48 496.89,365.76 499.95,368.82 503.02,372.99 506.09,378.27 509.16,384.62 512.22,391.55 515.29,398.43 518.36,405.06 521.43,411.41 524.49,417.31 527.56,421.81 530.63,424.01 533.70,423.73 536.76,420.98 539.83,416.44 542.90,411.99 545.97,408.96 549.03,407.49 552.10,407.55 555.17,408.58 558.24,409.55 561.30,409.95 564.37,409.77 567.44,409.04 570.51,408.15 573.57,407.57 576.64,407.46 579.71,407.84 582.78,408.67 585.84,409.89 588.91,411.43 591.98,413.28 595.04,415.43 598.11,417.74 601.18,419.79 604.25,421.31 607.31,422.26 610.38,422.68 613.45,423.00 616.52,424.06 619.58,426.24 622.65,429.57 625.72,433.84 628.79,437.21 631.85,437.33 634.92,433.45 637.99,425.57 641.06,414.22 644.12,401.78 647.19,390.54 650.26,380.88 653.33,372.83 656.39,366.61 659.46,362.84 662.53,361.96 665.60,364.01 668.66,368.94 671.73,375.66 674.80,382.25 677.86,387.78 680.93,392.22 684.00,395.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,139.56 76.65,132.99 79.72,126.34 82.79,121.11 85.85,117.32 88.92,114.97 91.99,114.06 95.06,114.62 98.12,116.65 101.19,120.05 104.26,123.96 107.33,127.10 110.39,129.01 113.46,129.68 116.53,129.28 119.60,128.80 122.66,129.26 125.73,130.89 128.80,133.68 131.86,137.24 134.93,140.31 138.00,141.89 141.07,141.88 144.13,140.31 147.20,138.17 150.27,137.50 153.34,139.42 156.40,143.97 159.47,151.00 162.54,158.63 165.61,164.23 168.67,166.80 171.74,166.36 174.81,163.23 177.88,159.31 180.94,156.55 184.01,155.39 187.08,155.82 190.15,157.85 193.21,161.53 196.28,166.88 199.35,173.91 202.42,182.60 205.48,192.37 208.55,202.05 211.62,211.02 214.69,219.25 217.75,226.75 220.82,233.70 223.89,240.35 226.95,246.79 230.02,253.01 233.09,258.91 236.16,263.90 239.22,267.37 242.29,269.19 245.36,269.38 248.43,268.40 251.49,267.72 254.56,268.42 257.63,270.64 260.70,274.36 263.76,279.19 266.83,284.36 269.90,289.47 272.97,294.48 276.03,299.33 279.10,303.18 282.17,304.91 285.24,304.09 288.30,300.74 291.37,295.40 294.44,291.02 297.51,290.57 300.57,294.65 303.64,303.27 306.71,315.36 309.78,327.73 312.84,338.00 315.91,345.91 318.98,351.48 322.04,355.08 325.11,357.46 328.18,358.99 331.25,359.69 334.31,359.64 337.38,359.43 340.45,359.92 343.52,361.39 346.58,363.86 349.65,367.13 352.72,370.27 355.79,372.33 358.85,373.12 361.92,372.65 364.99,371.13 368.06,369.22 371.12,367.37 374.19,365.64 377.26,364.04 380.33,362.92 383.39,362.92 386.46,364.37 389.53,367.31 392.60,371.60 395.66,376.25 398.73,379.86 401.80,381.96 404.86,382.55 407.93,381.83 411.00,380.77 414.07,380.34 417.13,380.73 420.20,381.94 423.27,383.85 426.34,386.07 429.40,388.32 432.47,390.59 435.54,392.86 438.61,395.06 441.67,397.02 444.74,398.69 447.81,400.04 450.88,401.03 453.94,401.19 457.01,399.92 460.08,397.01 463.15,392.44 466.21,386.47 469.28,380.29 472.35,375.06 475.42,371.00 478.48,368.12 481.55,366.40 484.62,365.83 487.69,366.37 490.75,368.03 493.82,370.80 496.89,374.45 499.95,378.52 503.02,382.81 506.09,387.30 509.16,391.95 512.22,396.44 515.29,400.33 518.36,403.47 521.43,405.87 524.49,407.44 527.56,407.78 530.63,406.50 533.70,403.53 536.76,398.88 539.83,393.21 542.90,388.36 545.97,385.63 549.03,385.16 552.10,386.91 555.17,390.32 558.24,394.36 561.30,398.50 564.37,402.73 567.44,406.97 570.51,410.64 573.57,412.93 576.64,413.60 579.71,412.64 582.78,410.44 585.84,408.78 588.91,409.35 591.98,412.46 595.04,418.11 598.11,425.45 601.18,432.15 604.25,436.59 607.31,438.61 610.38,438.25 613.45,436.09 616.52,433.20 619.58,430.10 622.65,426.81 625.72,423.33 628.79,419.73 631.85,416.08 634.92,412.39 637.99,408.68 641.06,405.03 644.12,401.85 647.19,399.54 650.26,398.18 653.33,397.75 656.39,397.78 659.46,397.03 662.53,394.60 665.60,390.43 668.66,384.54 671.73,377.44 674.80,370.00 677.86,362.68 680.93,355.47 684.00,349.51 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,125.15 76.65,119.28 79.72,114.02 82.79,110.89 85.85,109.88 88.92,110.64 91.99,112.46 95.06,114.94 98.12,118.07 101.19,121.86 104.26,126.44 107.33,132.01 110.39,138.64 113.46,146.33 116.53,154.84 119.60,162.72 122.66,168.48 125.73,171.77 128.80,172.61 131.86,171.34 134.93,169.09 138.00,166.72 141.07,164.33 144.13,161.92 147.20,159.27 150.27,155.93 153.34,151.66 156.40,146.43 159.47,140.40 162.54,135.07 165.61,132.61 168.67,133.80 171.74,138.66 174.81,146.72 177.88,155.41 180.94,162.08 184.01,166.14 187.08,167.62 190.15,167.24 193.21,167.36 196.28,169.74 199.35,174.61 202.42,181.91 205.48,190.88 208.55,199.92 211.62,208.19 214.69,215.63 217.75,222.27 220.82,228.29 223.89,233.93 226.95,239.30 230.02,244.38 233.09,249.10 236.16,252.96 239.22,255.48 242.29,256.55 245.36,256.17 248.43,254.91 251.49,254.50 254.56,256.23 257.63,260.25 260.70,266.54 263.76,274.48 266.83,282.84 269.90,290.98 272.97,298.87 276.03,306.48 279.10,313.49 282.17,319.48 285.24,324.30 288.30,327.95 291.37,330.42 294.44,331.70 297.51,331.78 300.57,330.66 303.64,328.33 306.71,325.25 309.78,322.78 312.84,321.92 315.91,322.80 318.98,325.38 322.04,329.25 325.11,333.58 328.18,337.92 331.25,342.27 334.31,346.57 337.38,350.25 340.45,352.56 343.52,353.22 346.58,352.24 349.65,349.88 352.72,347.53 355.79,346.55 358.85,347.23 361.92,349.56 364.99,353.36 368.06,358.08 371.12,363.31 374.19,369.00 377.26,375.15 380.33,381.41 383.39,387.14 386.46,391.99 389.53,395.96 392.60,399.01 395.66,400.79 398.73,400.84 401.80,398.99 404.86,395.24 407.93,389.99 411.00,385.16 414.07,382.63 417.13,382.81 420.20,385.68 423.27,390.64 426.34,395.98 429.40,400.44 432.47,403.91 435.54,406.38 438.61,407.88 441.67,408.46 444.74,408.13 447.81,406.89 450.88,404.74 453.94,401.47 457.01,396.83 460.08,390.74 463.15,383.19 466.21,374.54 469.28,366.46 472.35,360.62 475.42,357.33 478.48,356.59 481.55,357.86 484.62,359.63 487.69,360.82 490.75,361.32 493.82,361.16 496.89,360.74 499.95,360.84 503.02,361.87 506.09,363.83 509.16,366.70 512.22,370.28 515.29,374.29 518.36,378.66 521.43,383.37 524.49,388.36 527.56,393.32 530.63,397.96 533.70,402.22 536.76,406.10 539.83,409.67 542.90,413.15 545.97,416.68 549.03,420.28 552.10,423.93 555.17,427.24 558.24,429.49 561.30,430.31 564.37,429.69 567.44,427.67 570.51,424.61 573.57,420.95 576.64,416.86 579.71,412.33 582.78,407.65 585.84,404.22 588.91,403.35 591.98,405.28 595.04,410.02 598.11,416.63 601.18,422.64 604.25,426.30 607.31,427.43 610.38,426.10 613.45,423.20 616.52,420.37 619.58,418.44 622.65,417.41 625.72,417.20 628.79,416.90 631.85,415.36 634.92,412.23 637.99,407.49 641.06,401.43 644.12,395.34 647.19,390.43 650.26,386.93 653.33,384.83 656.39,383.89 659.46,383.49 662.53,383.18 665.60,382.92 668.66,382.74 671.73,382.93 674.80,384.05 677.86,386.37 680.93,389.90 684.00,393.68 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,92.09 76.65,99.63 79.72,107.71 82.79,114.70 85.85,120.58 88.92,125.36 91.99,128.99 95.06,131.45 98.12,132.74 101.19,132.93 104.26,132.80 107.33,133.44 110.39,135.28 113.46,138.32 116.53,142.35 119.60,146.19 122.66,148.60 125.73,149.31 128.80,148.32 131.86,145.74 134.93,141.95 138.00,137.26 141.07,131.69 144.13,125.28 147.20,119.23 150.27,115.94 153.34,116.75 156.40,121.74 159.47,130.70 162.54,141.60 165.61,151.53 168.67,159.42 171.74,165.25 174.81,169.12 177.88,171.59 180.94,173.22 184.01,174.12 187.08,174.32 190.15,174.12 193.21,174.58 196.28,176.47 199.35,179.89 202.42,184.81 205.48,190.69 208.55,196.42 211.62,201.39 214.69,205.58 217.75,209.04 220.82,212.39 223.89,216.50 226.95,221.66 230.02,227.90 233.09,235.09 236.16,242.65 239.22,250.00 242.29,256.99 245.36,263.64 248.43,269.90 251.49,275.66 254.56,280.85 257.63,285.45 260.70,289.48 263.76,293.15 266.83,296.91 269.90,301.01 272.97,305.46 276.03,310.18 279.10,314.47 282.17,317.33 285.24,318.41 288.30,317.71 291.37,315.58 294.44,313.83 297.51,314.29 300.57,317.34 303.64,322.99 306.71,330.47 309.78,337.57 312.84,342.59 315.91,345.37 318.98,345.94 322.04,344.95 325.11,343.67 328.18,342.79 331.25,342.34 334.31,342.39 337.38,343.69 340.45,347.25 343.52,353.44 346.58,362.25 349.65,373.08 352.72,382.88 355.79,388.58 358.85,389.56 361.92,385.82 364.99,378.62 368.06,371.61 371.12,367.50 374.19,366.57 377.26,368.77 380.33,373.18 383.39,377.99 386.46,382.28 389.53,386.00 392.60,389.08 395.66,390.89 398.73,390.55 401.80,387.76 404.86,382.52 407.93,375.32 411.00,368.52 414.07,364.50 417.13,363.71 420.20,366.15 423.27,371.11 426.34,376.52 429.40,380.89 432.47,384.05 435.54,386.02 438.61,386.92 441.67,387.01 444.74,386.40 447.81,385.11 450.88,383.17 453.94,380.94 457.01,378.91 460.08,377.24 463.15,375.93 466.21,374.97 469.28,374.28 472.35,373.81 475.42,373.53 478.48,373.44 481.55,373.62 484.62,374.25 487.69,375.46 490.75,377.26 493.82,379.64 496.89,382.34 499.95,384.85 503.02,386.94 506.09,388.58 509.16,389.81 512.22,390.96 515.29,392.42 518.36,394.35 521.43,396.74 524.49,399.47 527.56,401.91 530.63,403.49 533.70,404.09 536.76,403.71 539.83,402.62 542.90,401.56 545.97,401.05 549.03,401.14 552.10,401.84 555.17,402.91 558.24,404.00 561.30,404.89 564.37,405.60 567.44,406.14 570.51,406.82 573.57,408.01 576.64,409.84 579.71,412.31 582.78,415.27 585.84,418.01 588.91,419.85 591.98,420.66 595.04,420.44 598.11,419.31 601.18,417.51 604.25,415.25 607.31,412.54 610.38,409.40 613.45,406.16 616.52,403.43 619.58,401.50 622.65,400.39 625.72,400.03 628.79,399.90 631.85,399.33 634.92,398.10 637.99,396.21 641.06,393.84 644.12,391.73 647.19,390.61 650.26,390.60 653.33,391.71 656.39,393.56 659.46,395.18 662.53,395.90 665.60,395.66 668.66,394.48 671.73,392.71 674.80,391.01 677.86,389.69 680.93,388.76 684.00,388.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,177.04 76.65,171.59 79.72,164.84 82.79,157.77 85.85,150.40 88.92,143.38 91.99,138.02 95.06,135.07 98.12,134.57 101.19,136.37 104.26,138.96 107.33,140.11 110.39,139.02 113.46,135.66 116.53,130.34 119.60,124.71 122.66,120.51 125.73,118.13 128.80,117.56 131.86,118.56 134.93,120.30 138.00,122.17 141.07,124.09 144.13,126.08 147.20,128.45 150.27,131.86 153.34,136.68 156.40,142.93 159.47,150.47 162.54,157.94 165.61,163.40 168.67,166.11 171.74,166.09 174.81,163.68 177.88,160.86 180.94,159.67 184.01,160.55 187.08,163.52 190.15,168.37 193.21,174.54 196.28,181.57 199.35,189.42 202.42,198.06 205.48,206.69 208.55,213.69 211.62,218.19 214.69,220.14 217.75,219.67 220.82,217.99 223.89,216.84 226.95,216.83 230.02,217.97 233.09,220.28 236.16,223.88 239.22,228.89 242.29,235.32 245.36,243.18 248.43,252.03 251.49,260.52 254.56,267.63 257.63,273.26 260.70,277.41 263.76,280.62 266.83,283.91 269.90,287.83 272.97,292.41 276.03,297.64 279.10,303.56 282.17,310.19 285.24,317.55 288.30,325.64 291.37,334.22 294.44,342.07 297.51,347.95 300.57,351.61 303.64,353.04 306.71,352.54 309.78,351.02 312.84,349.15 315.91,347.00 318.98,344.59 322.04,342.43 325.11,341.51 328.18,342.36 331.25,345.00 334.31,349.30 337.38,353.92 340.45,357.06 343.52,358.07 346.58,356.95 349.65,354.01 352.72,350.86 355.79,349.11 358.85,349.08 361.92,350.77 364.99,354.00 368.06,358.24 371.12,363.09 374.19,368.52 377.26,374.49 380.33,380.45 383.39,385.33 386.46,388.55 389.53,390.09 392.60,390.02 395.66,388.89 398.73,387.46 401.80,385.97 404.86,384.44 407.93,383.05 411.00,382.69 414.07,384.24 417.13,387.89 420.20,393.63 423.27,400.59 426.34,406.27 429.40,408.85 432.47,408.15 435.54,404.20 438.61,397.84 441.67,390.62 444.74,383.37 447.81,376.11 450.88,368.89 453.94,362.27 457.01,356.99 460.08,353.28 463.15,351.15 466.21,350.66 469.28,352.00 472.35,355.41 475.42,360.91 478.48,368.51 481.55,377.28 484.62,384.57 487.69,388.51 490.75,388.89 493.82,385.81 496.89,380.79 499.95,376.74 503.02,375.11 506.09,375.96 509.16,379.12 512.22,383.17 515.29,386.18 518.36,387.53 521.43,387.22 524.49,385.47 527.56,383.32 530.63,381.79 533.70,381.06 536.76,381.14 539.83,382.01 542.90,383.62 545.97,385.93 549.03,388.94 552.10,392.64 555.17,396.78 558.24,400.93 561.30,404.87 564.37,408.58 567.44,412.07 570.51,415.28 573.57,418.15 576.64,420.66 579.71,422.81 582.78,424.54 585.84,425.63 588.91,425.84 591.98,425.14 595.04,423.54 598.11,421.35 601.18,419.50 604.25,418.61 607.31,418.74 610.38,419.88 613.45,421.69 616.52,423.53 619.58,425.11 622.65,426.41 625.72,427.41 628.79,427.93 631.85,427.72 634.92,426.72 637.99,424.91 641.06,422.30 644.12,418.90 647.19,414.71 650.26,409.73 653.33,403.96 656.39,397.79 659.46,392.22 662.53,387.96 665.60,385.06 668.66,383.53 671.73,383.40 674.80,384.70 677.86,387.45 680.93,391.65 684.00,396.17 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,103.25 76.65,103.56 79.72,104.42 82.79,105.89 85.85,107.96 88.92,110.53 91.99,113.33 95.06,116.24 98.12,119.25 101.19,122.31 104.26,124.88 107.33,126.18 110.39,125.93 113.46,124.13 116.53,121.06 119.60,118.39 122.66,117.85 125.73,119.84 128.80,124.35 131.86,130.82 134.93,137.50 138.00,143.02 141.07,147.22 144.13,150.10 147.20,151.81 150.27,152.62 153.34,152.68 156.40,152.01 159.47,150.64 162.54,149.15 165.61,148.35 168.67,148.53 171.74,149.69 174.81,151.80 177.88,154.64 180.94,157.99 184.01,161.81 187.08,166.09 190.15,170.58 193.21,174.43 196.28,177.03 199.35,178.30 202.42,178.29 205.48,178.17 208.55,180.32 211.62,186.03 214.69,195.36 217.75,208.06 220.82,221.59 223.89,232.34 226.95,239.03 230.02,241.65 233.09,240.67 236.16,238.71 239.22,238.43 242.29,240.42 245.36,244.66 248.43,250.78 251.49,257.64 254.56,264.39 257.63,270.92 260.70,277.25 263.76,283.47 266.83,289.80 269.90,296.37 272.97,303.17 276.03,310.16 279.10,316.96 282.17,323.02 285.24,328.15 288.30,332.35 291.37,335.67 294.44,338.37 297.51,340.74 300.57,342.82 303.64,344.62 306.71,346.11 309.78,347.17 312.84,347.75 315.91,347.81 318.98,347.38 322.04,346.52 325.11,345.37 328.18,344.02 331.25,342.46 334.31,340.74 337.38,339.23 340.45,338.47 343.52,338.64 346.58,339.75 349.65,341.81 352.72,344.96 355.79,349.33 358.85,354.94 361.92,361.79 364.99,369.38 368.06,376.23 371.12,381.26 374.19,384.34 377.26,385.51 380.33,385.48 383.39,385.61 386.46,386.60 389.53,388.49 392.60,391.27 395.66,394.78 398.73,398.85 401.80,403.40 404.86,408.44 407.93,413.82 411.00,418.84 414.07,422.81 417.13,425.59 420.20,427.18 423.27,427.63 426.34,427.07 429.40,425.59 432.47,423.22 435.54,419.95 438.61,415.84 441.67,411.00 444.74,405.49 447.81,399.32 450.88,392.49 453.94,384.98 457.01,376.82 460.08,367.98 463.15,358.49 466.21,348.67 469.28,340.19 472.35,334.69 475.42,332.48 478.48,333.56 481.55,337.15 484.62,341.09 487.69,343.80 490.75,345.14 493.82,345.12 496.89,344.18 499.95,343.15 503.02,342.44 506.09,342.06 509.16,342.05 512.22,342.65 515.29,344.19 518.36,346.77 521.43,350.40 524.49,354.99 527.56,360.11 530.63,365.35 533.70,370.63 536.76,375.95 539.83,381.33 542.90,386.86 545.97,392.59 549.03,398.51 552.10,404.62 555.17,410.78 558.24,416.69 561.30,422.23 564.37,427.38 567.44,432.09 570.51,435.91 573.57,438.23 576.64,438.84 579.71,437.76 582.78,435.10 585.84,431.37 588.91,427.07 591.98,422.31 595.04,417.07 598.11,411.64 601.18,406.75 604.25,402.93 607.31,400.23 610.38,398.65 613.45,398.16 616.52,398.72 619.58,400.31 622.65,402.92 625.72,406.48 628.79,410.28 631.85,413.41 634.92,415.58 637.99,416.79 641.06,417.17 644.12,417.32 647.19,417.82 650.26,418.76 653.33,420.14 656.39,421.68 659.46,422.60 662.53,422.38 665.60,420.95 668.66,418.35 671.73,414.98 674.80,411.55 677.86,408.40 680.93,405.56 684.00,403.38 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,64.86 76.65,70.85 79.72,77.56 82.79,83.75 85.85,89.43 88.92,95.00 91.99,101.30 95.06,108.78 98.12,117.48 101.19,127.31 104.26,137.36 107.33,146.32 110.39,153.70 113.46,159.51 116.53,163.53 119.60,164.66 122.66,161.74 125.73,154.52 128.80,142.99 131.86,128.59 134.93,115.84 138.00,108.23 141.07,106.18 144.13,109.63 147.20,117.26 150.27,126.36 153.34,135.43 156.40,144.39 159.47,153.16 162.54,160.75 165.61,165.77 168.67,167.69 171.74,166.52 174.81,162.57 177.88,157.62 180.94,153.49 184.01,150.58 187.08,148.90 190.15,148.78 193.21,151.28 196.28,157.20 199.35,166.64 202.42,179.56 205.48,194.74 208.55,209.76 211.62,223.30 214.69,235.31 217.75,245.77 220.82,254.58 223.89,261.61 226.95,266.80 230.02,270.16 233.09,271.64 236.16,271.04 239.22,268.15 242.29,262.92 245.36,255.35 248.43,246.47 251.49,239.35 254.56,236.33 257.63,237.66 260.70,243.30 263.76,252.31 266.83,262.79 269.90,273.73 272.97,285.09 276.03,296.78 279.10,307.94 282.17,317.37 285.24,324.66 288.30,329.80 291.37,332.94 294.44,334.82 297.51,336.22 300.57,337.30 303.64,338.06 306.71,338.46 309.78,338.45 312.84,337.98 315.91,337.03 318.98,335.62 322.04,334.17 325.11,333.49 328.18,333.99 331.25,335.71 334.31,338.58 337.38,342.08 340.45,345.49 343.52,348.56 346.58,351.28 349.65,353.75 352.72,356.37 355.79,359.57 358.85,363.43 361.92,367.94 364.99,372.66 368.06,376.28 371.12,377.83 374.19,377.21 377.26,374.49 380.33,371.03 383.39,369.51 386.46,371.31 389.53,376.48 392.60,384.85 395.66,394.75 398.73,403.93 401.80,411.61 404.86,417.79 407.93,422.37 411.00,424.94 414.07,425.09 417.13,422.74 420.20,417.87 423.27,411.03 426.34,403.72 429.40,397.02 432.47,391.07 435.54,385.83 438.61,381.03 441.67,376.12 444.74,370.82 447.81,365.12 450.88,359.12 453.94,353.75 457.01,350.28 460.08,349.13 463.15,350.30 466.21,353.62 469.28,358.34 472.35,363.69 475.42,369.53 478.48,375.85 481.55,382.07 484.62,386.54 487.69,388.06 490.75,386.51 493.82,381.97 496.89,375.81 499.95,370.60 503.02,367.64 506.09,366.99 509.16,368.53 512.22,371.30 515.29,374.00 518.36,376.23 521.43,377.97 524.49,379.32 527.56,380.69 530.63,382.47 533.70,384.75 536.76,387.53 539.83,390.96 542.90,395.49 545.97,401.44 549.03,408.84 552.10,417.64 555.17,427.08 558.24,435.71 561.30,442.82 564.37,448.39 567.44,452.37 570.51,454.35 573.57,453.80 576.64,450.55 579.71,444.60 582.78,436.41 585.84,428.14 588.91,421.85 591.98,417.92 595.04,416.35 598.11,416.58 601.18,417.07 604.25,416.78 607.31,415.58 610.38,413.51 613.45,410.82 616.52,408.02 619.58,405.33 622.65,402.77 625.72,400.34 628.79,398.14 631.85,396.27 634.92,394.77 637.99,393.63 641.06,392.85 644.12,392.34 647.19,392.03 650.26,391.91 653.33,391.97 656.39,392.11 659.46,392.04 662.53,391.55 665.60,390.63 668.66,389.28 671.73,387.72 674.80,386.33 677.86,385.28 680.93,384.58 684.00,384.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,129.38 76.65,118.36 79.72,107.67 82.79,99.96 85.85,95.22 88.92,93.24 91.99,93.61 95.06,96.10 98.12,100.70 101.19,107.33 104.26,115.17 107.33,123.03 110.39,130.47 113.46,137.49 116.53,144.03 119.60,149.80 122.66,154.50 125.73,158.05 128.80,160.46 131.86,161.75 134.93,162.02 138.00,161.32 141.07,159.67 144.13,157.08 147.20,153.81 150.27,150.39 153.34,147.12 156.40,144.03 159.47,141.14 162.54,139.01 165.61,138.39 168.67,139.55 171.74,142.50 174.81,147.09 177.88,152.51 180.94,157.91 184.01,163.12 187.08,168.12 190.15,173.05 193.21,178.25 196.28,184.00 199.35,190.33 202.42,197.22 205.48,204.24 208.55,210.49 211.62,215.49 214.69,219.22 217.75,221.71 220.82,223.39 223.89,224.86 226.95,226.32 230.02,227.77 233.09,229.34 236.16,231.63 239.22,235.27 242.29,240.39 245.36,246.99 248.43,254.64 251.49,261.96 254.56,267.95 257.63,272.48 260.70,275.58 263.76,277.82 266.83,280.36 269.90,283.79 272.97,288.14 276.03,293.35 279.10,298.70 282.17,303.19 285.24,306.47 288.30,308.54 291.37,309.65 294.44,311.05 297.51,314.04 300.57,318.89 303.64,325.59 306.71,333.38 309.78,339.97 312.84,343.67 315.91,344.30 318.98,341.88 322.04,337.49 325.11,333.16 328.18,329.98 331.25,328.00 334.31,327.27 337.38,328.25 340.45,331.60 343.52,337.54 346.58,346.08 349.65,356.72 352.72,366.92 355.79,374.14 358.85,377.86 361.92,378.10 364.99,375.73 368.06,373.36 371.12,372.91 374.19,374.57 377.26,378.31 380.33,383.29 383.39,387.93 386.46,391.39 389.53,393.63 392.60,394.71 395.66,395.06 398.73,395.28 401.80,395.60 404.86,395.99 407.93,396.54 411.00,397.59 414.07,399.46 417.13,402.22 420.20,405.87 423.27,409.98 426.34,413.29 429.40,414.91 432.47,414.74 435.54,412.78 438.61,409.32 441.67,404.88 444.74,399.70 447.81,393.81 450.88,387.28 453.94,380.83 457.01,375.41 460.08,371.34 463.15,368.63 466.21,367.16 469.28,366.36 472.35,365.69 475.42,365.04 478.48,364.40 481.55,363.85 484.62,363.57 487.69,363.68 490.75,364.21 493.82,365.15 496.89,366.28 499.95,367.24 503.02,367.85 506.09,368.08 509.16,367.97 512.22,367.76 515.29,367.76 518.36,368.08 521.43,368.72 524.49,369.67 527.56,370.95 530.63,372.56 533.70,374.51 536.76,376.80 539.83,379.40 542.90,382.24 545.97,385.29 549.03,388.53 552.10,391.99 555.17,395.96 558.24,401.00 561.30,407.40 564.37,415.16 567.44,424.14 570.51,433.03 573.57,440.12 576.64,444.87 579.71,447.25 582.78,447.44 585.84,446.13 588.91,443.98 591.98,441.12 595.04,437.54 598.11,433.48 601.18,429.48 604.25,425.97 607.31,422.96 610.38,420.48 613.45,418.47 616.52,416.89 619.58,415.70 622.65,414.90 625.72,414.43 628.79,413.77 631.85,412.24 634.92,409.64 637.99,405.95 641.06,401.42 644.12,397.13 647.19,394.09 650.26,392.50 653.33,392.34 656.39,393.13 659.46,393.59 662.53,392.80 665.60,390.70 668.66,387.31 671.73,383.33 674.80,379.98 677.86,377.85 680.93,376.96 684.00,377.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,114.81 76.65,106.26 79.72,98.07 82.79,92.34 85.85,89.07 88.92,88.64 91.99,91.80 95.06,98.99 98.12,110.23 101.19,125.29 104.26,141.71 107.33,155.96 110.39,166.69 113.46,173.90 116.53,177.72 119.60,178.89 122.66,178.19 125.73,175.81 128.80,171.73 131.86,166.20 134.93,159.98 138.00,153.65 141.07,147.29 144.13,140.89 147.20,134.71 150.27,129.21 153.34,124.68 156.40,121.12 159.47,118.58 162.54,117.64 165.61,119.12 168.67,123.30 171.74,130.20 174.81,139.44 177.88,148.99 180.94,156.73 184.01,162.19 187.08,165.40 190.15,166.91 193.21,168.51 196.28,171.57 199.35,176.23 202.42,182.50 205.48,189.98 208.55,197.92 211.62,205.89 214.69,213.88 217.75,221.83 220.82,229.04 223.89,234.56 226.95,238.03 230.02,239.45 233.09,239.11 236.16,238.53 239.22,239.27 242.29,241.67 245.36,245.73 248.43,251.16 251.49,257.16 254.56,263.11 257.63,268.94 260.70,274.64 263.76,280.13 266.83,285.25 269.90,289.91 272.97,294.11 276.03,297.88 279.10,301.56 282.17,305.62 285.24,310.23 288.30,315.39 291.37,321.01 294.44,326.63 297.51,331.80 300.57,336.42 303.64,340.49 306.71,343.99 309.78,346.93 312.84,349.30 315.91,351.08 318.98,352.27 322.04,352.59 325.11,351.46 328.18,348.59 331.25,343.96 334.31,337.76 337.38,331.90 340.45,328.97 343.52,329.88 346.58,334.63 349.65,342.74 352.72,351.70 355.79,359.01 358.85,364.16 361.92,367.15 364.99,368.28 368.06,368.45 371.12,368.31 374.19,367.93 377.26,367.34 380.33,367.10 383.39,368.30 386.46,371.50 389.53,376.72 392.60,383.83 395.66,391.49 398.73,397.87 401.80,402.37 404.86,404.98 407.93,405.97 411.00,406.64 414.07,408.33 417.13,411.29 420.20,415.50 423.27,420.28 426.34,423.61 429.40,424.03 432.47,421.40 435.54,415.74 438.61,407.99 441.67,399.86 444.74,392.26 447.81,385.21 450.88,378.76 453.94,373.36 457.01,369.60 460.08,367.68 463.15,367.61 466.21,369.13 469.28,371.07 472.35,372.28 475.42,372.53 478.48,371.84 481.55,370.53 484.62,369.58 487.69,369.69 490.75,370.93 493.82,373.27 496.89,376.40 499.95,379.72 503.02,382.91 506.09,385.97 509.16,388.88 512.22,391.53 515.29,393.79 518.36,395.60 521.43,396.97 524.49,397.81 527.56,397.75 530.63,396.41 533.70,393.73 536.76,389.70 539.83,384.98 542.90,381.32 545.97,379.99 549.03,381.11 552.10,384.64 555.17,389.66 558.24,394.51 561.30,398.36 564.37,401.18 567.44,403.07 570.51,404.95 573.57,408.04 576.64,412.71 579.71,418.99 582.78,426.51 585.84,433.70 588.91,439.05 591.98,442.27 595.04,443.37 598.11,442.51 601.18,440.11 604.25,436.49 607.31,431.66 610.38,425.67 613.45,419.24 616.52,413.68 619.58,409.65 622.65,407.17 625.72,406.13 628.79,405.63 631.85,404.52 634.92,402.44 637.99,399.37 641.06,395.47 644.12,391.39 647.19,387.77 650.26,384.71 653.33,382.21 656.39,380.43 659.46,379.75 662.53,380.43 665.60,382.51 668.66,385.94 671.73,389.92 674.80,393.03 677.86,394.58 680.93,394.55 684.00,393.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,113.32 76.65,114.49 79.72,116.33 82.79,118.73 85.85,121.67 88.92,124.77 91.99,127.23 95.06,128.60 98.12,128.88 101.19,128.12 104.26,127.17 107.33,127.23 110.39,128.75 113.46,131.72 116.53,135.88 119.60,139.65 122.66,141.37 125.73,140.68 128.80,137.57 131.86,132.59 134.93,127.40 138.00,123.31 141.07,120.47 144.13,118.88 147.20,118.67 150.27,120.08 153.34,123.25 156.40,128.20 159.47,134.82 162.54,142.12 165.61,148.68 168.67,153.98 171.74,158.02 174.81,160.96 177.88,163.72 180.94,167.27 184.01,171.82 187.08,177.35 190.15,183.64 193.21,190.00 196.28,195.88 199.35,201.22 202.42,206.03 205.48,210.66 208.55,215.79 211.62,221.80 214.69,228.70 217.75,236.34 220.82,243.18 223.89,247.00 226.95,247.03 230.02,243.25 233.09,236.22 236.16,228.90 239.22,224.31 242.29,223.10 245.36,225.28 248.43,230.53 251.49,237.97 254.56,246.91 257.63,257.27 260.70,269.00 263.76,280.80 266.83,290.07 269.90,295.44 272.97,296.84 276.03,294.53 279.10,291.20 282.17,290.59 285.24,294.01 288.30,301.47 291.37,312.37 294.44,323.50 297.51,331.61 300.57,336.03 303.64,336.76 306.71,334.58 309.78,331.86 312.84,330.36 315.91,330.26 318.98,331.56 322.04,333.93 325.11,336.80 328.18,339.82 331.25,342.99 334.31,346.32 337.38,349.78 340.45,353.38 343.52,357.11 346.58,360.96 349.65,364.88 352.72,368.61 355.79,371.86 358.85,374.58 361.92,376.78 364.99,378.58 368.06,380.39 371.12,382.51 374.19,384.96 377.26,387.73 380.33,390.55 383.39,392.88 386.46,394.44 389.53,395.23 392.60,395.28 395.66,395.07 398.73,395.25 401.80,396.03 404.86,397.41 407.93,399.34 411.00,401.56 414.07,403.81 417.13,406.03 420.20,408.23 423.27,410.05 426.34,410.52 429.40,408.90 432.47,405.13 435.54,399.24 438.61,392.04 441.67,385.05 444.74,379.05 447.81,374.08 450.88,370.08 453.94,366.49 457.01,362.61 460.08,358.17 463.15,353.18 466.21,347.77 469.28,342.61 472.35,338.33 475.42,335.06 478.48,332.81 481.55,331.66 484.62,331.89 487.69,333.68 490.75,337.05 493.82,341.97 496.89,347.96 499.95,354.06 503.02,359.82 506.09,365.19 509.16,370.22 512.22,375.00 515.29,379.73 518.36,384.44 521.43,389.14 524.49,393.78 527.56,398.12 530.63,401.91 533.70,405.12 536.76,407.75 539.83,409.89 542.90,411.76 545.97,413.55 549.03,415.27 552.10,416.92 555.17,418.49 558.24,419.97 561.30,421.37 564.37,422.67 567.44,423.89 570.51,425.04 573.57,426.18 576.64,427.31 579.71,428.43 582.78,429.62 585.84,431.31 588.91,433.89 591.98,437.42 595.04,441.91 598.11,446.80 601.18,450.58 604.25,452.21 607.31,451.58 610.38,448.70 613.45,444.04 616.52,438.37 619.58,432.09 622.65,425.21 625.72,417.85 628.79,410.92 631.85,405.61 634.92,402.31 637.99,401.01 641.06,401.43 644.12,402.24 647.19,402.21 650.26,401.12 653.33,398.95 656.39,395.94 659.46,392.66 662.53,389.51 665.60,386.53 668.66,383.72 671.73,381.10 674.80,378.70 677.86,376.54 680.93,374.62 684.00,373.17 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,142.52 76.65,143.82 79.72,144.57 82.79,144.33 85.85,143.11 88.92,141.14 91.99,138.89 95.06,136.63 98.12,134.37 101.19,132.15 104.26,130.34 107.33,129.49 110.39,129.79 113.46,131.25 116.53,133.80 119.60,137.04 122.66,140.54 125.73,144.21 128.80,148.04 131.86,151.78 134.93,154.53 138.00,155.65 141.07,155.04 144.13,152.73 147.20,149.28 150.27,145.86 153.34,143.08 156.40,140.99 159.47,139.62 162.54,139.28 165.61,140.46 168.67,143.31 171.74,147.85 174.81,153.82 177.88,159.90 180.94,164.70 184.01,167.92 187.08,169.57 190.15,170.14 193.21,171.22 196.28,174.00 199.35,178.60 202.42,185.03 205.48,192.74 208.55,200.72 211.62,208.39 214.69,215.72 217.75,222.65 220.82,228.51 223.89,232.38 226.95,233.90 230.02,233.08 233.09,230.29 236.16,227.52 239.22,226.80 242.29,228.57 245.36,232.82 248.43,239.20 251.49,246.60 254.56,254.19 257.63,261.88 260.70,269.67 263.76,277.59 266.83,285.73 269.90,294.11 272.97,302.74 276.03,311.57 279.10,320.11 282.17,327.68 285.24,334.03 288.30,339.16 291.37,342.98 294.44,344.97 297.51,344.60 300.57,341.77 303.64,336.48 306.71,329.68 309.78,324.19 312.84,322.14 315.91,323.74 318.98,328.93 322.04,335.88 325.11,341.05 328.18,342.56 331.25,340.32 334.31,334.62 337.38,328.24 340.45,324.98 343.52,326.16 346.58,331.80 349.65,341.29 352.72,351.51 355.79,359.37 358.85,364.22 361.92,366.07 364.99,365.71 368.06,365.45 371.12,367.01 374.19,370.55 377.26,376.04 380.33,382.51 383.39,388.12 386.46,391.89 389.53,393.79 392.60,393.94 395.66,393.49 398.73,394.01 401.80,396.02 404.86,399.53 407.93,404.35 411.00,409.55 414.07,414.19 417.13,418.08 420.20,421.22 423.27,423.35 426.34,423.76 429.40,421.92 432.47,417.76 435.54,411.31 438.61,403.27 441.67,394.90 444.74,386.88 447.81,379.22 450.88,371.94 453.94,365.26 457.01,359.43 460.08,354.55 463.15,350.61 466.21,347.56 469.28,345.05 472.35,342.77 475.42,340.65 478.48,338.70 481.55,337.19 484.62,336.92 487.69,338.46 490.75,341.86 493.82,347.09 496.89,353.59 499.95,360.29 503.02,366.66 506.09,372.68 509.16,378.31 512.22,383.28 515.29,387.25 518.36,390.08 521.43,391.79 524.49,392.48 527.56,392.73 530.63,393.07 533.70,393.62 536.76,394.37 539.83,395.35 542.90,396.66 545.97,398.35 549.03,400.44 552.10,402.91 555.17,405.58 558.24,408.08 561.30,410.25 564.37,412.08 567.44,413.60 570.51,415.18 573.57,417.26 576.64,419.99 579.71,423.38 582.78,427.36 585.84,431.66 588.91,436.01 591.98,440.36 595.04,444.70 598.11,448.83 601.18,452.15 604.25,454.22 607.31,455.02 610.38,454.55 613.45,452.73 616.52,449.46 619.58,444.69 622.65,438.40 625.72,430.71 628.79,422.61 631.85,415.36 634.92,409.35 637.99,404.58 641.06,400.99 644.12,398.22 647.19,395.95 650.26,394.11 653.33,392.70 656.39,391.64 659.46,390.70 662.53,389.73 665.60,388.71 668.66,387.63 671.73,386.47 674.80,385.14 677.86,383.63 680.93,381.92 684.00,380.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,139.52 76.65,140.37 79.72,140.21 82.79,138.61 85.85,135.59 88.92,132.22 91.99,130.66 95.06,132.13 98.12,136.68 101.19,144.16 104.26,152.73 107.33,159.75 110.39,164.23 113.46,166.16 116.53,165.66 119.60,163.35 122.66,159.92 125.73,155.51 128.80,150.13 131.86,144.02 134.93,137.98 138.00,132.64 141.07,128.06 144.13,124.25 147.20,121.34 150.27,119.55 153.34,119.03 156.40,119.78 159.47,121.78 162.54,124.86 165.61,128.74 168.67,133.34 171.74,138.65 174.81,144.73 177.88,151.87 180.94,160.38 184.01,170.33 187.08,181.71 190.15,193.57 193.21,202.90 196.28,207.43 199.35,206.90 202.42,201.39 205.48,193.46 208.55,188.16 211.62,188.26 214.69,193.90 217.75,204.80 220.82,218.10 223.89,229.79 226.95,238.42 230.02,243.96 233.09,246.73 236.16,248.34 239.22,250.45 242.29,253.39 245.36,257.19 248.43,261.60 251.49,265.94 254.56,269.69 257.63,272.79 260.70,275.25 263.76,277.43 266.83,280.02 269.90,283.39 272.97,287.55 276.03,292.46 279.10,297.59 282.17,302.21 285.24,306.05 288.30,309.12 291.37,311.55 294.44,314.02 297.51,317.23 300.57,321.32 303.64,326.30 306.71,331.97 309.78,337.74 312.84,343.16 315.91,348.19 318.98,352.81 322.04,356.61 325.11,358.76 328.18,358.84 331.25,356.84 334.31,352.88 337.38,348.28 340.45,344.87 343.52,343.26 346.58,343.47 349.65,345.28 352.72,347.53 355.79,349.08 358.85,349.70 361.92,349.40 364.99,348.79 368.06,349.73 371.12,353.55 374.19,360.39 377.26,370.20 380.33,381.25 383.39,390.24 386.46,395.46 389.53,396.84 392.60,394.61 395.66,391.11 398.73,389.47 401.80,390.78 404.86,395.04 407.93,401.86 411.00,409.32 414.07,415.49 417.13,419.99 420.20,422.84 423.27,424.17 426.34,424.40 429.40,423.84 432.47,422.51 435.54,420.41 438.61,417.31 441.67,412.81 444.74,406.69 447.81,398.94 450.88,389.69 453.94,380.09 457.01,371.67 460.08,364.96 463.15,359.95 466.21,356.63 469.28,354.92 472.35,354.74 475.42,356.06 478.48,358.89 481.55,362.79 484.62,366.53 487.69,369.24 490.75,370.81 493.82,371.28 496.89,371.04 499.95,370.82 503.02,371.00 506.09,371.60 509.16,372.60 512.22,373.94 515.29,375.50 518.36,377.26 521.43,379.22 524.49,381.31 527.56,383.17 530.63,384.47 533.70,385.15 536.76,385.20 539.83,385.00 542.90,385.52 545.97,387.50 549.03,390.98 552.10,395.95 555.17,401.93 558.24,408.04 561.30,413.84 564.37,419.32 567.44,424.46 570.51,429.15 573.57,433.27 576.64,436.77 579.71,439.64 582.78,441.88 585.84,443.48 588.91,444.42 591.98,444.70 595.04,444.32 598.11,443.17 601.18,440.97 604.25,437.51 607.31,432.77 610.38,426.78 613.45,420.13 616.52,413.88 619.58,408.54 622.65,404.14 625.72,400.62 628.79,397.52 631.85,394.23 634.92,390.57 637.99,386.54 641.06,382.27 644.12,378.36 647.19,375.38 650.26,373.43 653.33,372.52 656.39,372.53 659.46,373.14 662.53,374.13 665.60,375.49 668.66,377.19 671.73,378.80 674.80,379.54 677.86,379.02 680.93,377.23 684.00,374.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,95.82 76.65,96.58 79.72,98.59 82.79,101.96 85.85,106.68 88.92,112.39 91.99,118.37 95.06,124.22 98.12,129.92 101.19,135.47 104.26,140.93 107.33,146.37 110.39,151.80 113.46,157.25 116.53,162.52 119.60,166.64 122.66,168.59 125.73,168.13 128.80,165.28 131.86,160.40 134.93,154.69 138.00,149.06 141.07,143.63 144.13,138.40 147.20,133.70 150.27,130.20 153.34,128.26 156.40,127.90 159.47,129.11 162.54,131.88 165.61,136.17 168.67,141.96 171.74,149.25 174.81,157.85 177.88,166.68 180.94,174.60 184.01,181.38 187.08,187.02 190.15,191.65 193.21,195.74 196.28,199.64 199.35,203.38 202.42,206.95 205.48,210.08 208.55,212.23 211.62,213.11 214.69,212.70 217.75,211.09 220.82,209.20 223.89,208.31 226.95,208.88 230.02,210.93 233.09,214.26 236.16,217.83 239.22,220.56 242.29,222.23 245.36,222.85 248.43,223.12 251.49,225.16 254.56,230.60 257.63,239.60 260.70,252.12 263.76,266.77 266.83,280.82 269.90,292.81 272.97,302.68 276.03,310.47 279.10,316.72 282.17,322.17 285.24,327.10 288.30,331.51 291.37,335.30 294.44,338.09 297.51,339.45 300.57,339.31 303.64,337.65 306.71,334.99 309.78,332.80 312.84,332.18 315.91,333.25 318.98,335.98 322.04,339.40 325.11,341.63 328.18,341.69 331.25,339.52 334.31,335.33 337.38,331.00 340.45,329.11 343.52,330.58 346.58,335.40 349.65,343.14 352.72,351.59 355.79,358.54 358.85,363.52 361.92,366.54 364.99,368.01 368.06,369.12 371.12,370.72 374.19,372.93 377.26,375.73 380.33,379.22 383.39,383.58 386.46,388.91 389.53,395.20 392.60,402.37 395.66,409.54 398.73,415.51 401.80,419.88 404.86,422.64 407.93,423.80 411.00,423.29 414.07,421.10 417.13,417.19 420.20,411.59 423.27,404.68 426.34,397.58 429.40,391.11 432.47,385.37 435.54,380.35 438.61,376.30 441.67,373.66 444.74,372.66 447.81,373.30 450.88,375.50 453.94,378.30 457.01,380.44 460.08,381.52 463.15,381.51 466.21,380.58 469.28,379.43 472.35,378.76 475.42,378.72 478.48,379.29 481.55,380.23 484.62,380.78 487.69,380.41 490.75,379.08 493.82,376.82 496.89,374.20 499.95,372.31 503.02,371.71 506.09,372.41 509.16,374.35 512.22,376.83 515.29,378.96 518.36,380.42 521.43,381.23 524.49,381.57 527.56,382.32 530.63,384.35 533.70,387.81 536.76,392.71 539.83,398.44 542.90,403.36 545.97,406.30 549.03,407.15 552.10,405.95 555.17,403.71 558.24,402.28 561.30,402.56 564.37,404.60 567.44,408.25 570.51,412.28 573.57,415.05 576.64,416.05 579.71,415.28 582.78,412.92 585.84,409.86 588.91,406.93 591.98,404.31 595.04,401.98 598.11,400.01 601.18,398.60 604.25,397.85 607.31,397.80 610.38,398.43 613.45,399.45 616.52,400.35 619.58,400.90 622.65,401.08 625.72,400.95 628.79,400.99 631.85,401.81 634.92,403.62 637.99,406.41 641.06,409.80 644.12,412.04 647.19,411.46 650.26,407.78 653.33,400.99 656.39,391.97 659.46,383.03 662.53,375.79 665.60,370.40 668.66,366.82 671.73,364.58 674.80,362.86 677.86,361.24 680.93,359.71 684.00,358.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,154.41 76.65,149.01 79.72,142.92 82.79,137.23 85.85,131.97 88.92,127.70 91.99,125.59 95.06,126.28 98.12,129.82 101.19,136.07 104.26,143.62 107.33,150.41 110.39,155.69 113.46,159.43 116.53,161.64 119.60,162.25 122.66,161.23 125.73,158.55 128.80,154.22 131.86,148.41 134.93,141.65 138.00,134.37 141.07,126.61 144.13,118.42 147.20,111.05 150.27,107.06 153.34,107.87 156.40,113.54 159.47,123.85 162.54,136.29 165.61,147.30 168.67,155.59 171.74,161.12 174.81,164.09 177.88,165.48 180.94,166.31 184.01,166.79 187.08,166.94 190.15,166.96 193.21,167.50 196.28,169.05 199.35,171.67 202.42,175.37 205.48,180.32 208.55,186.88 211.62,195.26 214.69,205.45 217.75,217.29 220.82,229.01 223.89,238.12 226.95,243.71 230.02,245.79 233.09,244.75 236.16,242.73 239.22,241.94 242.29,242.84 245.36,245.44 248.43,249.46 251.49,254.10 254.56,258.75 257.63,263.33 260.70,267.87 263.76,272.57 266.83,277.84 269.90,283.93 272.97,290.82 276.03,298.50 279.10,306.62 282.17,314.73 285.24,322.66 288.30,330.41 291.37,337.84 294.44,344.15 297.51,348.56 300.57,350.91 303.64,351.20 306.71,349.89 309.78,348.33 312.84,347.55 315.91,347.66 318.98,348.65 322.04,350.32 325.11,352.31 328.18,354.41 331.25,356.63 334.31,358.88 337.38,360.51 340.45,360.60 343.52,358.83 346.58,355.21 349.65,350.06 352.72,345.07 355.79,341.92 358.85,340.95 361.92,342.17 364.99,345.30 368.06,349.57 371.12,354.40 374.19,359.73 377.26,365.54 380.33,371.35 383.39,376.23 386.46,379.69 389.53,381.72 392.60,382.43 395.66,382.79 398.73,384.16 401.80,386.98 404.86,391.26 407.93,396.87 411.00,403.19 414.07,409.58 417.13,415.91 420.20,422.20 423.27,427.80 426.34,430.91 429.40,430.21 432.47,425.57 435.54,417.06 438.61,406.29 441.67,396.30 444.74,388.65 447.81,383.40 450.88,380.44 453.94,378.79 457.01,377.13 460.08,375.01 463.15,372.42 466.21,369.42 469.28,366.25 472.35,363.16 475.42,360.18 478.48,357.33 481.55,354.58 484.62,351.91 487.69,349.29 490.75,346.73 493.82,344.25 496.89,342.51 499.95,342.75 503.02,345.59 506.09,351.06 509.16,358.96 512.22,367.60 515.29,374.72 518.36,379.58 521.43,382.18 524.49,382.80 527.56,382.81 530.63,383.53 533.70,385.22 536.76,387.86 539.83,391.27 542.90,394.90 545.97,398.36 549.03,401.61 552.10,404.63 555.17,407.07 558.24,408.24 561.30,407.82 564.37,405.80 567.44,402.31 570.51,398.68 573.57,396.62 576.64,396.66 579.71,398.82 582.78,402.77 585.84,407.03 588.91,410.17 591.98,411.92 595.04,412.30 598.11,411.79 601.18,411.71 604.25,412.98 607.31,415.70 610.38,419.84 613.45,424.86 616.52,429.79 619.58,434.16 622.65,437.93 625.72,441.13 628.79,443.81 631.85,446.04 634.92,447.84 637.99,449.22 641.06,450.21 644.12,451.04 647.19,451.91 650.26,452.86 653.33,453.87 656.39,454.85 659.46,455.49 662.53,455.57 665.60,455.08 668.66,454.01 671.73,452.42 674.80,450.34 677.86,447.81 680.93,444.84 684.00,442.04 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,93.83 76.65,95.91 79.72,99.07 82.79,103.07 85.85,107.90 88.92,113.35 91.99,119.02 95.06,124.67 98.12,130.27 101.19,135.79 104.26,140.57 107.33,143.69 110.39,144.82 113.46,143.94 116.53,141.23 119.60,137.61 122.66,134.08 125.73,130.85 128.80,127.91 131.86,125.24 134.93,122.70 138.00,120.18 141.07,117.70 144.13,115.25 147.20,113.37 150.27,113.14 153.34,115.15 156.40,119.44 159.47,125.95 162.54,133.94 165.61,142.40 168.67,150.96 171.74,159.62 174.81,168.25 177.88,176.22 180.94,182.88 184.01,188.09 187.08,191.84 190.15,194.54 193.21,197.44 196.28,201.49 199.35,206.81 202.42,213.35 205.48,220.13 208.55,225.21 211.62,227.50 214.69,226.96 217.75,223.78 220.82,219.93 223.89,218.18 226.95,219.54 230.02,224.01 233.09,231.22 236.16,239.18 239.22,245.85 242.29,250.78 245.36,253.99 248.43,255.82 251.49,257.31 254.56,259.25 257.63,261.73 260.70,264.74 263.76,268.27 266.83,272.26 269.90,276.69 272.97,281.56 276.03,286.85 279.10,292.33 282.17,297.69 285.24,302.82 288.30,307.74 291.37,312.54 294.44,317.86 297.51,324.33 300.57,332.08 303.64,341.10 306.71,350.61 309.78,358.26 312.84,362.29 315.91,362.53 318.98,359.02 322.04,353.35 325.11,348.57 328.18,346.29 331.25,346.58 334.31,349.31 337.38,353.04 340.45,355.82 343.52,356.96 346.58,356.46 349.65,354.63 352.72,353.00 355.79,353.13 358.85,355.34 361.92,359.61 364.99,365.25 368.06,370.18 371.12,372.86 374.19,373.15 377.26,371.08 380.33,367.97 383.39,366.33 386.46,367.44 389.53,371.37 392.60,378.01 395.66,386.26 398.73,394.63 401.80,402.62 404.86,410.23 407.93,417.23 411.00,422.45 414.07,424.77 417.13,423.94 420.20,419.98 423.27,413.57 426.34,406.68 429.40,400.75 432.47,395.92 435.54,392.18 438.61,389.35 441.67,387.08 444.74,385.18 447.81,383.66 450.88,382.49 453.94,381.55 457.01,380.65 460.08,379.74 463.15,378.80 466.21,377.86 469.28,376.96 472.35,376.14 475.42,375.42 478.48,374.79 481.55,374.08 484.62,372.79 487.69,370.57 490.75,367.38 493.82,363.26 496.89,358.88 499.95,355.51 503.02,353.80 506.09,353.78 509.16,355.35 512.22,357.76 515.29,360.04 518.36,361.84 521.43,363.17 524.49,364.21 527.56,365.79 530.63,368.72 533.70,373.16 536.76,379.10 539.83,386.19 542.90,393.46 545.97,400.22 549.03,406.40 552.10,411.98 555.17,416.78 558.24,420.41 561.30,422.69 564.37,423.61 567.44,423.27 570.51,422.38 573.57,421.90 576.64,422.14 579.71,423.09 582.78,424.64 585.84,426.23 588.91,427.31 591.98,427.78 595.04,427.65 598.11,427.00 601.18,426.09 604.25,425.09 607.31,424.02 610.38,422.87 613.45,421.54 616.52,419.84 619.58,417.67 622.65,415.04 625.72,412.01 628.79,409.19 631.85,407.34 634.92,406.69 637.99,407.27 641.06,408.90 644.12,410.87 647.19,412.50 650.26,413.67 653.33,414.37 656.39,414.41 659.46,413.26 662.53,410.54 665.60,406.22 668.66,400.34 671.73,393.65 674.80,387.50 677.86,382.55 680.93,378.80 684.00,376.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,114.47 76.65,118.56 79.72,121.99 82.79,123.65 85.85,123.58 88.92,122.53 91.99,122.08 95.06,123.11 98.12,125.67 101.19,129.66 104.26,133.94 107.33,136.89 110.39,137.90 113.46,136.95 116.53,134.28 119.60,131.15 122.66,128.90 125.73,127.83 128.80,127.93 131.86,128.86 134.93,129.46 138.00,128.89 141.07,127.02 144.13,123.89 147.20,120.12 150.27,117.02 153.34,115.29 156.40,114.98 159.47,116.12 162.54,119.25 165.61,125.11 168.67,133.97 171.74,145.83 174.81,160.21 177.88,174.41 180.94,185.62 184.01,193.23 187.08,197.25 190.15,198.19 193.21,197.60 196.28,196.68 199.35,195.58 202.42,194.30 205.48,193.35 208.55,193.69 211.62,195.88 214.69,199.92 217.75,205.76 220.82,212.75 223.89,220.00 226.95,227.18 230.02,234.29 233.09,241.12 236.16,246.65 239.22,249.82 242.29,250.40 245.36,248.40 248.43,244.73 251.49,242.17 254.56,242.83 257.63,246.93 260.70,254.45 263.76,264.39 266.83,274.83 269.90,284.72 272.97,294.01 276.03,302.72 279.10,310.99 282.17,318.99 285.24,326.78 288.30,334.38 291.37,341.62 294.44,347.71 297.51,351.84 300.57,353.85 303.64,353.73 306.71,351.90 309.78,349.60 312.84,347.76 315.91,346.47 318.98,345.73 322.04,345.02 325.11,343.39 328.18,340.33 331.25,335.82 334.31,329.99 337.38,324.15 340.45,320.10 343.52,318.49 346.58,319.30 349.65,322.48 352.72,327.70 355.79,334.60 358.85,343.13 361.92,353.28 364.99,364.57 368.06,375.58 371.12,385.25 374.19,393.49 377.26,400.29 380.33,405.71 383.39,409.90 386.46,412.90 389.53,414.73 392.60,415.40 395.66,415.18 398.73,414.41 401.80,413.21 404.86,411.57 407.93,409.71 411.00,408.67 414.07,409.50 417.13,412.39 420.20,417.33 423.27,423.58 426.34,428.94 429.40,431.83 432.47,432.07 435.54,429.69 438.61,424.93 441.67,418.28 444.74,409.98 447.81,400.05 450.88,388.57 453.94,376.43 457.01,364.81 460.08,354.10 463.15,344.31 466.21,335.60 469.28,328.80 472.35,324.71 475.42,323.48 478.48,325.12 481.55,329.11 484.62,333.99 487.69,338.72 490.75,343.20 493.82,347.42 496.89,351.39 499.95,355.11 503.02,358.56 506.09,361.76 509.16,364.73 512.22,367.74 515.29,371.15 518.36,375.08 521.43,379.52 524.49,384.41 527.56,389.32 530.63,393.87 533.70,397.99 536.76,401.68 539.83,404.98 542.90,408.05 545.97,411.00 549.03,413.84 552.10,416.55 555.17,418.93 558.24,420.58 561.30,421.33 564.37,421.17 567.44,420.14 570.51,418.77 573.57,417.74 576.64,417.27 579.71,417.35 582.78,418.02 585.84,419.44 588.91,421.76 591.98,425.01 595.04,429.18 598.11,433.71 601.18,437.06 604.25,438.17 607.31,436.91 610.38,433.35 613.45,428.27 616.52,423.12 619.58,418.61 622.65,414.76 625.72,411.57 628.79,408.93 631.85,406.74 634.92,404.96 637.99,403.59 641.06,402.49 644.12,401.06 647.19,398.70 650.26,395.33 653.33,390.93 656.39,386.00 659.46,381.83 662.53,379.33 665.60,378.56 668.66,379.52 671.73,381.73 674.80,384.38 677.86,387.07 680.93,389.80 684.00,392.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,91.29 76.65,90.63 79.72,91.63 82.79,94.80 85.85,100.14 88.92,107.41 91.99,116.10 95.06,125.93 98.12,136.89 101.19,148.81 104.26,159.86 107.33,167.39 110.39,170.42 113.46,168.92 116.53,163.29 119.60,155.56 122.66,147.93 125.73,140.87 128.80,134.38 131.86,128.45 134.93,123.02 138.00,118.06 141.07,113.55 144.13,109.53 147.20,106.69 150.27,106.50 153.34,109.74 156.40,116.45 159.47,126.47 162.54,138.03 165.61,148.61 168.67,157.28 171.74,164.03 174.81,169.04 177.88,173.27 180.94,177.70 184.01,182.55 187.08,187.81 190.15,193.09 193.21,197.14 196.28,198.98 199.35,198.52 202.42,195.80 205.48,192.09 208.55,189.94 211.62,190.74 214.69,194.55 217.75,201.24 220.82,209.51 223.89,217.52 226.95,224.60 230.02,230.73 233.09,235.94 236.16,240.29 239.22,243.84 242.29,246.60 245.36,248.58 248.43,250.20 251.49,252.71 254.56,257.07 257.63,263.38 260.70,271.63 263.76,281.07 266.83,290.27 269.90,298.47 272.97,305.62 276.03,311.73 279.10,316.85 282.17,321.05 285.24,324.35 288.30,326.76 291.37,328.38 294.44,329.78 297.51,331.54 300.57,333.79 303.64,336.51 306.71,339.50 309.78,342.11 312.84,343.85 315.91,344.67 318.98,344.58 322.04,343.91 325.11,343.28 328.18,343.03 331.25,343.18 334.31,343.70 337.38,344.46 340.45,345.26 343.52,346.03 346.58,346.77 349.65,347.55 352.72,348.64 355.79,350.35 358.85,352.73 361.92,355.79 364.99,359.31 368.06,362.70 371.12,365.52 374.19,367.71 377.26,369.29 380.33,370.31 383.39,370.87 386.46,371.02 389.53,370.77 392.60,370.18 395.66,369.88 398.73,370.71 401.80,372.96 404.86,376.64 407.93,381.61 411.00,387.23 414.07,392.85 417.13,398.34 420.20,403.71 423.27,408.75 426.34,412.88 429.40,415.70 432.47,417.15 435.54,417.26 438.61,416.32 441.67,414.95 444.74,413.43 447.81,411.78 450.88,409.98 453.94,407.81 457.01,404.99 460.08,401.42 463.15,397.09 466.21,392.05 469.28,386.44 472.35,380.43 475.42,374.03 478.48,367.25 481.55,360.72 484.62,356.21 487.69,354.96 490.75,357.12 493.82,362.62 496.89,370.23 499.95,377.66 503.02,383.72 506.09,388.38 509.16,391.67 512.22,393.81 515.29,395.10 518.36,395.65 521.43,395.45 524.49,394.67 527.56,394.10 530.63,394.50 533.70,396.02 536.76,398.66 539.83,401.97 542.90,404.79 545.97,406.26 549.03,406.31 552.10,404.96 555.17,402.72 558.24,400.53 561.30,398.86 564.37,397.74 567.44,397.15 570.51,397.12 573.57,397.67 576.64,398.80 579.71,400.51 582.78,402.64 585.84,404.46 588.91,405.24 591.98,404.86 595.04,403.32 598.11,400.90 601.18,398.33 604.25,396.15 607.31,394.41 610.38,393.09 613.45,392.08 616.52,391.17 619.58,390.25 622.65,389.32 625.72,388.44 628.79,388.13 631.85,389.06 634.92,391.45 637.99,395.29 641.06,400.52 644.12,406.76 647.19,413.69 650.26,421.25 653.33,429.42 656.39,437.77 659.46,445.11 662.53,450.62 665.60,454.23 668.66,455.98 671.73,456.44 674.80,456.70 677.86,457.26 680.93,458.13 684.00,459.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,68.16 76.65,69.57 79.72,72.29 82.79,76.28 85.85,81.54 88.92,87.84 91.99,94.73 95.06,101.95 98.12,109.49 101.19,117.31 104.26,124.92 107.33,131.65 110.39,137.24 113.46,141.69 116.53,145.11 119.60,148.23 122.66,151.77 125.73,155.91 128.80,160.63 131.86,165.47 134.93,168.93 138.00,169.85 141.07,168.09 144.13,163.69 147.20,157.49 150.27,151.24 153.34,145.91 156.40,141.54 159.47,138.16 162.54,136.19 165.61,136.20 168.67,138.41 171.74,142.80 174.81,149.12 177.88,155.83 180.94,161.34 184.01,165.32 187.08,167.76 190.15,168.89 193.21,169.37 196.28,169.71 199.35,169.97 202.42,170.19 205.48,171.29 208.55,175.14 211.62,182.75 214.69,194.17 217.75,209.15 220.82,225.15 223.89,238.56 226.95,248.10 230.02,253.75 233.09,255.78 236.16,255.66 239.22,254.88 242.29,253.78 245.36,252.34 248.43,250.77 251.49,249.64 254.56,249.39 257.63,250.07 260.70,251.69 263.76,254.54 266.83,259.16 269.90,265.86 272.97,274.65 276.03,285.42 279.10,297.12 282.17,308.26 285.24,318.32 288.30,327.31 291.37,335.10 294.44,341.09 297.51,344.70 300.57,345.79 303.64,344.36 306.71,341.07 309.78,337.83 312.84,336.07 315.91,335.97 318.98,337.49 322.04,340.20 325.11,343.29 328.18,346.30 331.25,349.22 334.31,352.05 337.38,354.71 340.45,357.12 343.52,359.26 346.58,361.12 349.65,362.69 352.72,363.95 355.79,364.88 358.85,365.46 361.92,365.70 364.99,365.77 368.06,366.13 371.12,367.16 374.19,368.88 377.26,371.29 380.33,374.12 383.39,376.89 386.46,379.33 389.53,381.43 392.60,383.24 395.66,385.08 398.73,387.43 401.80,390.44 404.86,394.11 407.93,398.26 411.00,401.92 414.07,404.17 417.13,404.82 420.20,403.87 423.27,401.61 426.34,398.89 429.40,396.33 432.47,393.99 435.54,391.88 438.61,389.99 441.67,388.33 444.74,386.90 447.81,385.72 450.88,384.82 453.94,384.69 457.01,385.98 460.08,388.91 463.15,393.46 466.21,399.25 469.28,404.36 472.35,406.90 475.42,406.51 478.48,403.19 481.55,397.54 484.62,391.27 487.69,385.60 490.75,380.65 493.82,376.43 496.89,373.37 499.95,372.20 503.02,373.33 506.09,376.77 509.16,382.31 512.22,388.04 515.29,391.47 518.36,391.76 521.43,388.92 524.49,383.47 527.56,377.93 530.63,374.74 533.70,374.37 536.76,376.80 539.83,381.33 542.90,386.04 545.97,389.55 549.03,391.72 552.10,392.59 555.17,392.71 558.24,393.07 561.30,394.20 564.37,396.11 567.44,398.76 570.51,401.78 573.57,404.73 576.64,407.43 579.71,409.91 582.78,412.20 585.84,414.57 588.91,417.26 591.98,420.30 595.04,423.71 598.11,427.25 601.18,430.32 604.25,432.48 607.31,433.70 610.38,433.97 613.45,433.27 616.52,431.52 619.58,428.70 622.65,424.80 625.72,419.88 628.79,414.36 631.85,408.77 634.92,403.29 637.99,397.93 641.06,392.79 644.12,388.39 647.19,385.22 650.26,383.36 653.33,382.82 656.39,383.28 659.46,383.90 662.53,384.11 665.60,383.86 668.66,383.16 671.73,382.42 674.80,382.36 677.86,383.35 680.93,385.39 684.00,387.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,137.77 76.65,144.60 79.72,150.27 82.79,152.91 85.85,152.55 88.92,150.40 91.99,148.90 95.06,149.45 98.12,152.11 101.19,156.72 104.26,161.51 107.33,163.95 110.39,163.08 113.46,158.88 116.53,151.85 119.60,144.69 122.66,140.24 125.73,139.14 128.80,141.38 131.86,146.19 134.93,151.12 138.00,154.26 141.07,155.38 144.13,154.52 147.20,152.26 150.27,149.78 153.34,147.73 156.40,146.16 159.47,145.05 162.54,144.34 165.61,143.95 168.67,143.84 171.74,144.01 174.81,144.47 177.88,145.18 180.94,146.15 184.01,147.37 187.08,148.83 190.15,150.90 193.21,154.66 196.28,160.95 199.35,169.87 202.42,181.39 205.48,194.55 208.55,207.44 211.62,219.03 214.69,229.26 217.75,238.09 220.82,244.88 223.89,248.78 226.95,249.48 230.02,246.97 233.09,241.80 236.16,236.91 239.22,235.32 242.29,237.67 245.36,243.96 248.43,253.30 251.49,263.06 254.56,271.20 257.63,277.51 260.70,282.01 263.76,285.04 266.83,287.31 269.90,289.18 272.97,290.68 276.03,291.89 279.10,293.61 282.17,296.98 285.24,302.39 288.30,309.86 291.37,319.02 294.44,328.01 297.51,334.94 300.57,339.42 303.64,341.45 306.71,341.48 309.78,340.87 312.84,340.62 315.91,340.83 318.98,341.50 322.04,342.30 325.11,342.63 328.18,342.15 331.25,340.86 334.31,338.76 337.38,335.97 340.45,332.66 343.52,328.89 346.58,324.66 349.65,320.37 352.72,318.07 355.79,319.83 358.85,326.07 361.92,336.78 364.99,350.66 368.06,363.94 371.12,373.82 374.19,380.01 377.26,382.59 380.33,383.30 383.39,385.52 386.46,390.98 389.53,399.76 392.60,411.57 395.66,423.66 398.73,432.26 401.80,436.10 404.86,435.16 407.93,430.12 411.00,424.25 414.07,420.79 417.13,420.40 420.20,423.07 423.27,427.76 426.34,431.55 429.40,432.26 432.47,429.70 435.54,423.89 438.61,415.66 441.67,406.54 444.74,397.33 447.81,388.07 450.88,378.79 453.94,369.96 457.01,362.20 460.08,355.71 463.15,350.49 466.21,346.58 469.28,344.10 472.35,343.21 475.42,343.91 478.48,346.22 481.55,349.85 484.62,354.03 487.69,358.18 490.75,362.26 493.82,366.24 496.89,369.72 499.95,371.92 503.02,372.46 506.09,371.32 509.16,368.66 512.22,365.83 515.29,364.66 518.36,365.74 521.43,369.08 524.49,374.40 527.56,380.39 530.63,385.80 533.70,390.39 536.76,394.15 539.83,397.20 542.90,399.83 545.97,402.24 549.03,404.46 552.10,406.49 555.17,408.30 558.24,409.84 561.30,411.09 564.37,412.05 567.44,412.72 570.51,413.08 573.57,413.12 576.64,412.82 579.71,412.20 582.78,411.41 585.84,411.30 588.91,412.66 591.98,415.62 595.04,420.18 598.11,425.72 601.18,430.50 604.25,433.31 607.31,434.05 610.38,432.74 613.45,430.07 616.52,427.30 619.58,425.03 622.65,423.29 625.72,422.04 628.79,421.05 631.85,420.00 634.92,418.79 637.99,417.42 641.06,415.91 644.12,414.34 647.19,412.77 650.26,411.22 653.33,409.68 656.39,408.16 659.46,406.66 662.53,405.18 665.60,403.72 668.66,402.28 671.73,401.06 674.80,400.39 677.86,400.42 680.93,401.18 684.00,402.30 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,115.64 76.65,119.78 79.72,124.98 82.79,130.54 85.85,136.41 88.92,141.97 91.99,145.88 95.06,147.39 98.12,146.47 101.19,143.20 104.26,138.53 107.33,133.84 110.39,129.63 113.46,125.90 116.53,122.70 119.60,120.22 122.66,118.66 125.73,118.08 128.80,118.47 131.86,119.82 134.93,122.08 138.00,125.22 141.07,129.24 144.13,134.13 147.20,139.32 150.27,143.73 153.34,146.72 156.40,148.29 159.47,148.50 162.54,148.28 165.61,148.96 168.67,151.02 171.74,154.45 174.81,159.09 177.88,164.02 180.94,168.26 184.01,171.61 187.08,174.07 190.15,175.91 193.21,177.95 196.28,180.82 199.35,184.60 202.42,189.28 205.48,194.69 208.55,200.47 211.62,206.43 214.69,212.55 217.75,218.79 220.82,224.52 223.89,228.89 226.95,231.57 230.02,232.58 233.09,232.16 236.16,231.71 239.22,232.68 242.29,235.35 245.36,239.74 248.43,245.41 251.49,251.04 254.56,255.66 257.63,259.15 260.70,261.54 263.76,263.92 266.83,268.37 269.90,276.03 272.97,286.95 276.03,300.85 279.10,314.90 282.17,325.18 285.24,330.30 288.30,330.24 291.37,325.67 294.44,320.09 297.51,317.06 300.57,317.30 303.64,320.81 306.71,326.86 309.78,333.27 312.84,338.41 315.91,342.10 318.98,344.36 322.04,345.56 325.11,346.40 328.18,347.26 331.25,348.17 334.31,349.15 337.38,350.69 340.45,353.40 343.52,357.53 346.58,363.05 349.65,369.65 352.72,375.59 355.79,379.14 358.85,379.96 361.92,378.05 364.99,374.13 368.06,370.30 371.12,368.13 374.19,367.78 377.26,369.21 380.33,371.61 383.39,373.43 386.46,373.85 389.53,372.84 392.60,370.54 395.66,368.34 398.73,368.09 401.80,370.43 404.86,375.37 407.93,382.52 411.00,389.92 414.07,395.66 417.13,399.33 420.20,400.95 423.27,400.81 426.34,399.76 429.40,398.40 432.47,396.80 435.54,394.96 438.61,393.07 441.67,391.45 444.74,390.27 447.81,389.54 450.88,389.19 453.94,388.52 457.01,386.59 460.08,383.09 463.15,378.02 466.21,371.65 469.28,365.25 472.35,360.08 475.42,356.40 478.48,354.19 481.55,353.44 484.62,354.05 487.69,355.99 490.75,359.23 493.82,363.77 496.89,369.17 499.95,374.65 503.02,379.81 506.09,384.64 509.16,389.08 512.22,392.69 515.29,394.86 518.36,395.41 521.43,394.32 524.49,391.89 527.56,389.47 530.63,388.38 533.70,388.85 536.76,390.90 539.83,394.03 542.90,396.89 545.97,398.53 549.03,398.86 552.10,397.92 555.17,396.63 558.24,396.64 561.30,398.78 564.37,403.09 567.44,409.43 570.51,416.57 573.57,422.87 576.64,427.83 579.71,431.44 582.78,433.77 585.84,435.18 588.91,436.01 591.98,436.32 595.04,436.10 598.11,435.29 601.18,433.70 604.25,431.20 607.31,427.78 610.38,423.46 613.45,418.63 616.52,413.98 619.58,409.86 622.65,406.28 625.72,403.24 628.79,400.61 631.85,398.25 634.92,396.12 637.99,394.22 641.06,392.63 644.12,391.82 647.19,392.21 650.26,393.86 653.33,396.79 656.39,400.87 659.46,405.79 662.53,411.34 665.60,417.49 668.66,424.23 671.73,431.11 674.80,437.36 677.86,442.60 680.93,446.81 684.00,449.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='73.58,160.16 76.65,158.24 79.72,154.43 82.79,148.78 85.85,141.32 88.92,133.36 91.99,127.59 95.06,125.52 98.12,127.24 101.19,132.53 104.26,139.17 107.33,143.94 110.39,145.63 113.46,144.24 116.53,140.16 119.60,135.64 122.66,133.06 125.73,132.94 128.80,135.27 131.86,139.37 134.93,143.04 138.00,144.58 141.07,143.80 144.13,140.73 147.20,136.38 150.27,132.77 153.34,131.03 156.40,131.23 159.47,133.31 162.54,136.78 165.61,140.94 168.67,145.52 171.74,150.53 174.81,155.98 177.88,161.97 180.94,168.58 184.01,175.83 187.08,183.73 190.15,191.74 193.21,198.18 196.28,201.79 199.35,202.43 202.42,200.14 205.48,196.12 208.55,192.82 211.62,191.56 214.69,192.39 217.75,195.27 220.82,199.57 223.89,204.45 226.95,209.58 230.02,214.97 233.09,220.68 236.16,227.07 239.22,234.50 242.29,243.05 245.36,252.72 248.43,263.08 251.49,272.86 254.56,281.10 257.63,287.69 260.70,292.65 263.76,296.36 266.83,299.59 269.90,302.75 272.97,305.87 276.03,308.94 279.10,311.94 282.17,314.84 285.24,317.64 288.30,320.34 291.37,322.90 294.44,325.23 297.51,327.19 300.57,328.77 303.64,329.97 306.71,330.93 309.78,332.04 312.84,333.62 315.91,335.69 318.98,338.24 322.04,340.87 325.11,342.79 328.18,343.60 331.25,343.27 334.31,341.90 337.38,340.31 340.45,339.68 343.52,340.40 346.58,342.47 349.65,345.84 352.72,350.23 355.79,355.36 358.85,361.17 361.92,367.66 364.99,374.53 368.06,380.93 371.12,386.22 374.19,390.34 377.26,393.29 380.33,395.06 383.39,395.65 386.46,395.05 389.53,393.26 392.60,390.40 395.66,387.62 398.73,386.50 401.80,387.55 404.86,390.79 407.93,395.93 411.00,401.58 414.07,406.32 417.13,409.89 420.20,412.29 423.27,413.35 426.34,412.61 429.40,409.72 432.47,404.66 435.54,397.45 438.61,388.97 441.67,380.87 444.74,373.99 447.81,368.37 450.88,363.95 453.94,360.15 457.01,356.22 460.08,351.90 463.15,347.19 466.21,342.34 469.28,338.65 472.35,337.35 475.42,338.68 478.48,342.65 481.55,348.62 484.62,354.79 487.69,359.89 490.75,363.77 493.82,366.44 496.89,367.99 499.95,368.54 503.02,368.16 506.09,366.87 509.16,364.85 512.22,363.85 515.29,366.16 518.36,372.55 521.43,383.02 524.49,396.94 527.56,411.35 530.63,423.36 533.70,432.42 536.76,438.55 539.83,441.98 542.90,443.36 545.97,443.17 549.03,441.45 552.10,438.23 555.17,434.11 558.24,430.21 561.30,427.09 564.37,424.76 567.44,423.20 570.51,422.14 573.57,421.26 576.64,420.43 579.71,419.66 582.78,418.94 585.84,418.22 588.91,417.47 591.98,416.67 595.04,415.82 598.11,415.09 601.18,414.91 604.25,415.60 607.31,417.18 610.38,419.62 613.45,422.47 616.52,424.89 619.58,426.47 622.65,427.19 625.72,427.03 628.79,425.81 631.85,423.27 634.92,419.34 637.99,414.02 641.06,407.58 644.12,401.28 647.19,396.29 650.26,392.83 653.33,390.90 656.39,390.23 659.46,390.10 662.53,390.03 665.60,389.98 668.66,389.93 671.73,389.87 674.80,389.74 677.86,389.53 680.93,389.23 684.00,388.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<rect x='43.06' y='22.78' width='671.46' height='522.33' style='stroke-width: 1.07; stroke: #333333;' /> +<g clip-path='url(#cpMzguMTd8NzE0LjUyfDIyLjc4fDU0NS4xMQ==)'> +<rect x='38.17' y='22.78' width='676.35' height='522.33' style='stroke-width: 1.07; stroke: none; fill: #FFFFFF;' /> +<polyline points='38.17,455.73 714.52,455.73 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='38.17,314.92 714.52,314.92 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='38.17,174.11 714.52,174.11 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='38.17,33.30 714.52,33.30 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='48.07,545.11 48.07,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='193.97,545.11 193.97,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='339.87,545.11 339.87,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='501.40,545.11 501.40,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='662.93,545.11 662.93,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='38.17,526.14 714.52,526.14 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='38.17,385.32 714.52,385.32 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='38.17,244.51 714.52,244.51 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='38.17,103.70 714.52,103.70 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='121.02,545.11 121.02,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='266.92,545.11 266.92,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='412.82,545.11 412.82,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='589.98,545.11 589.98,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<line x1='38.17' y1='385.32' x2='714.52' y2='385.32' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.50; stroke-linecap: butt;' /> +<polyline points='68.91,151.07 79.33,161.71 89.75,178.99 100.18,198.11 110.60,212.08 121.02,216.71 131.44,214.33 141.86,208.79 152.28,202.20 162.70,197.64 173.13,198.20 183.55,206.74 193.97,229.09 204.39,268.49 214.81,314.54 225.23,349.97 235.66,368.69 246.08,378.16 256.50,386.62 266.92,396.30 277.34,408.13 287.76,422.50 298.18,433.93 308.61,432.68 319.03,416.02 329.45,396.57 339.87,389.21 350.29,395.41 360.71,406.91 371.13,417.12 381.56,424.55 391.98,427.88 402.40,426.65 412.82,422.74 423.24,418.52 433.66,414.96 444.08,412.92 454.51,413.17 464.93,416.39 475.35,423.76 485.77,435.39 496.19,445.78 506.61,447.43 517.03,439.58 527.46,430.00 537.88,425.89 548.30,427.08 558.72,430.33 569.14,433.40 579.56,433.55 589.98,426.97 600.41,412.45 610.83,391.34 621.25,365.01 631.67,335.72 642.09,308.64 652.51,287.27 662.93,272.32 673.36,264.44 683.78,262.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,136.50 79.33,126.05 89.75,127.33 100.18,142.29 110.60,157.04 121.02,163.69 131.44,171.24 141.86,193.93 152.28,233.08 162.70,267.78 173.13,277.09 183.55,265.11 193.97,253.66 204.39,257.15 214.81,270.65 225.23,284.22 235.66,294.24 246.08,304.36 256.50,318.64 266.92,336.60 277.34,354.12 287.76,368.16 298.18,378.52 308.61,385.33 319.03,389.44 329.45,395.98 339.87,410.92 350.29,432.76 360.71,451.26 371.13,458.44 381.56,456.95 391.98,453.82 402.40,452.59 412.82,452.44 423.24,452.14 433.66,451.39 444.08,450.39 454.51,449.32 464.93,448.12 475.35,446.62 485.77,444.71 496.19,442.27 506.61,439.12 517.03,435.21 527.46,430.58 537.88,425.22 548.30,417.74 558.72,404.92 569.14,385.25 579.56,364.53 589.98,351.44 600.41,348.42 610.83,350.98 621.25,354.59 631.67,357.19 642.09,355.76 652.51,348.59 662.93,340.54 673.36,339.58 683.78,344.98 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,208.18 79.33,186.19 89.75,161.50 100.18,145.63 110.60,148.35 121.02,174.42 131.44,208.25 141.86,226.13 152.28,222.08 162.70,211.91 173.13,211.57 183.55,222.05 193.97,237.50 204.39,253.85 214.81,269.62 225.23,282.98 235.66,294.02 246.08,308.04 256.50,330.71 266.92,359.78 277.34,384.75 287.76,398.15 298.18,403.42 308.61,408.04 319.03,415.43 329.45,424.83 339.87,435.24 350.29,445.44 360.71,452.33 371.13,453.49 381.56,450.22 391.98,445.56 402.40,441.51 412.82,441.15 423.24,448.31 433.66,461.31 444.08,469.55 454.51,464.07 464.93,448.24 475.35,431.96 485.77,420.67 496.19,412.56 506.61,404.77 517.03,397.27 527.46,394.13 537.88,399.06 548.30,409.03 558.72,415.50 569.14,413.42 579.56,405.71 589.98,397.14 600.41,389.22 610.83,380.22 621.25,368.44 631.67,354.96 642.09,343.51 652.51,336.57 662.93,333.74 673.36,334.07 683.78,335.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,115.70 79.33,121.22 89.75,149.96 100.18,197.18 110.60,238.44 121.02,258.97 131.44,263.67 141.86,261.39 152.28,256.53 162.70,254.21 173.13,259.45 183.55,271.89 193.97,287.92 204.39,304.86 214.81,319.45 225.23,326.75 235.66,326.40 246.08,328.66 256.50,344.61 266.92,373.40 277.34,404.99 287.76,431.87 298.18,451.32 308.61,459.92 319.03,456.74 329.45,446.66 339.87,435.39 350.29,424.59 360.71,414.74 371.13,406.15 381.56,397.94 391.98,388.29 402.40,377.07 412.82,370.80 423.24,377.73 433.66,397.28 444.08,417.85 454.51,429.61 464.93,434.99 475.35,442.20 485.77,455.45 496.19,470.29 506.61,480.34 517.03,483.19 527.46,477.71 537.88,462.96 548.30,442.40 558.72,424.44 569.14,414.11 579.56,409.08 589.98,405.43 600.41,400.91 610.83,391.73 621.25,374.20 631.67,350.46 642.09,328.01 652.51,311.81 662.93,300.64 673.36,291.91 683.78,285.88 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,301.73 79.33,307.46 89.75,291.05 100.18,251.79 110.60,210.43 121.02,180.12 131.44,163.87 141.86,164.77 152.28,182.08 162.70,206.07 173.13,227.00 183.55,244.51 193.97,262.75 204.39,284.24 214.81,304.46 225.23,315.74 235.66,316.59 246.08,317.48 256.50,329.76 266.92,353.79 277.34,382.92 287.76,411.97 298.18,435.63 308.61,445.49 319.03,439.05 329.45,426.48 339.87,419.76 350.29,421.12 360.71,427.44 371.13,436.18 381.56,445.20 391.98,451.02 402.40,451.88 412.82,448.19 423.24,440.54 433.66,429.98 444.08,419.76 454.51,412.66 464.93,408.75 475.35,407.31 485.77,407.83 496.19,409.10 506.61,409.52 517.03,409.21 527.46,411.04 537.88,417.59 548.30,425.58 558.72,426.36 569.14,415.12 579.56,398.14 589.98,385.23 600.41,379.22 610.83,375.69 621.25,370.19 631.67,363.12 642.09,357.83 652.51,356.50 662.93,358.10 673.36,360.68 683.78,362.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,134.96 79.33,146.23 89.75,167.35 100.18,195.56 110.60,226.70 121.02,257.62 131.44,281.24 141.86,287.38 152.28,274.45 162.70,254.29 173.13,238.85 183.55,231.41 193.97,234.26 204.39,248.69 214.81,270.56 225.23,293.03 235.66,313.26 246.08,331.79 256.50,349.25 266.92,365.86 277.34,381.84 287.76,397.25 298.18,410.47 308.61,418.63 319.03,420.95 329.45,421.34 339.87,424.39 350.29,429.48 360.71,430.61 371.13,423.20 381.56,412.78 391.98,411.05 402.40,423.16 412.82,441.52 423.24,456.29 433.66,464.10 444.08,463.53 454.51,453.49 464.93,438.05 475.35,426.17 485.77,422.43 496.19,421.77 506.61,416.98 517.03,406.82 527.46,396.61 537.88,391.29 548.30,390.99 558.72,394.04 569.14,399.19 579.56,403.70 589.98,403.65 600.41,398.50 610.83,392.92 621.25,391.57 631.67,393.03 642.09,391.19 652.51,382.35 662.93,372.57 673.36,372.07 683.78,379.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,114.92 79.33,125.50 89.75,140.87 100.18,156.21 110.60,165.84 121.02,166.73 131.44,164.70 141.86,168.74 152.28,181.87 162.70,201.81 173.13,226.17 183.55,251.18 193.97,268.18 204.39,271.83 214.81,269.90 225.23,275.67 235.66,294.48 246.08,324.39 256.50,363.11 266.92,406.53 277.34,444.06 287.76,467.98 298.18,478.55 308.61,477.64 319.03,466.14 329.45,444.08 339.87,411.45 350.29,374.14 360.71,351.57 371.13,358.72 381.56,385.16 391.98,407.24 402.40,413.86 412.82,414.56 423.24,421.91 433.66,437.88 444.08,455.43 454.51,468.53 464.93,476.46 475.35,479.56 485.77,478.02 496.19,471.84 506.61,461.00 517.03,445.93 527.46,428.52 537.88,410.57 548.30,394.50 558.72,385.24 569.14,385.30 579.56,388.16 589.98,383.94 600.41,370.81 610.83,358.43 621.25,356.46 631.67,364.32 642.09,375.62 652.51,385.82 662.93,391.92 673.36,389.67 683.78,381.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,221.98 79.33,217.21 89.75,205.04 100.18,188.34 110.60,175.44 121.02,171.26 131.44,173.04 141.86,176.10 152.28,178.99 162.70,183.42 173.13,191.09 183.55,201.85 193.97,214.33 204.39,227.71 214.81,243.24 225.23,263.05 235.66,287.71 246.08,315.08 256.50,342.83 266.92,371.06 277.34,401.57 287.76,435.43 298.18,467.78 308.61,489.85 319.03,497.93 329.45,494.81 339.87,483.93 350.29,467.49 360.71,449.77 371.13,434.18 381.56,421.37 391.98,411.80 402.40,405.40 412.82,399.70 423.24,391.62 433.66,382.03 444.08,377.76 454.51,384.55 464.93,399.52 475.35,414.77 485.77,426.03 496.19,435.19 506.61,445.17 517.03,455.99 527.46,463.45 537.88,463.71 548.30,457.78 558.72,449.61 569.14,441.41 579.56,430.87 589.98,414.37 600.41,391.48 610.83,367.07 621.25,346.02 631.67,328.99 642.09,315.20 652.51,303.99 662.93,293.53 673.36,280.94 683.78,269.19 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,234.19 79.33,224.70 89.75,216.70 100.18,211.27 110.60,201.30 121.02,183.27 131.44,167.76 141.86,170.92 152.28,194.96 162.70,219.66 173.13,224.80 183.55,213.44 193.97,204.32 204.39,209.99 214.81,228.18 225.23,253.54 235.66,283.21 246.08,313.84 256.50,341.91 266.92,368.32 277.34,398.20 287.76,434.85 298.18,470.35 308.61,490.11 319.03,488.66 329.45,475.59 339.87,462.35 350.29,451.56 360.71,441.85 371.13,432.18 381.56,423.31 391.98,416.95 402.40,413.99 412.82,414.51 423.24,418.54 433.66,426.78 444.08,441.78 454.51,465.57 464.93,492.96 475.35,512.34 485.77,517.29 496.19,509.54 506.61,491.90 517.03,466.94 527.46,441.68 537.88,422.55 548.30,408.94 558.72,396.78 569.14,383.41 579.56,366.62 589.98,343.42 600.41,314.41 610.83,288.26 621.25,273.56 631.67,269.63 642.09,270.23 652.51,271.10 662.93,271.22 673.36,269.48 683.78,266.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,407.35 79.33,380.98 89.75,350.19 100.18,320.62 110.60,285.43 121.02,241.23 131.44,198.16 141.86,171.64 152.28,166.59 162.70,177.70 173.13,199.57 183.55,229.65 193.97,264.09 204.39,300.00 214.81,333.21 225.23,357.36 235.66,370.28 246.08,375.16 256.50,375.51 266.92,372.62 277.34,367.88 287.76,362.46 298.18,359.36 308.61,363.62 319.03,376.88 329.45,393.96 339.87,408.75 350.29,420.11 360.71,429.61 371.13,438.45 381.56,444.81 391.98,444.95 402.40,437.74 412.82,429.68 423.24,429.07 433.66,437.27 444.08,450.08 454.51,463.77 464.93,476.00 475.35,482.88 485.77,482.31 496.19,475.03 506.61,462.23 517.03,445.21 527.46,427.75 537.88,413.32 548.30,401.20 558.72,388.27 569.14,372.92 579.56,358.51 589.98,350.17 600.41,349.57 610.83,355.26 621.25,365.73 631.67,379.61 642.09,394.07 652.51,407.19 662.93,418.37 673.36,426.90 683.78,431.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,319.07 79.33,315.51 89.75,308.22 100.18,295.67 110.60,273.91 121.02,241.33 131.44,207.78 141.86,188.09 152.28,186.25 162.70,193.69 173.13,201.76 183.55,209.55 193.97,219.28 204.39,232.51 214.81,250.15 225.23,273.48 235.66,301.77 246.08,327.55 256.50,342.77 266.92,349.11 277.34,357.02 287.76,373.96 298.18,396.14 308.61,415.54 319.03,428.89 329.45,439.86 339.87,452.80 350.29,466.00 360.71,469.91 371.13,457.27 381.56,435.68 391.98,421.49 402.40,422.27 412.82,430.47 423.24,436.15 433.66,437.17 444.08,436.79 454.51,437.77 464.93,438.58 475.35,435.18 485.77,425.74 496.19,414.67 506.61,408.17 517.03,407.51 527.46,409.18 537.88,409.91 548.30,409.01 558.72,406.18 569.14,401.37 579.56,396.14 589.98,392.82 600.41,391.50 610.83,388.23 621.25,379.08 631.67,364.71 642.09,348.83 652.51,334.09 662.93,322.76 673.36,318.08 683.78,319.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,140.76 79.33,155.26 89.75,173.77 100.18,192.29 110.60,211.29 121.02,230.94 131.44,250.13 141.86,267.12 152.28,280.52 162.70,286.58 173.13,281.61 183.55,268.78 193.97,258.37 204.39,257.24 214.81,263.55 225.23,273.41 235.66,285.22 246.08,299.28 256.50,316.00 266.92,336.49 277.34,363.78 287.76,399.72 298.18,437.67 308.61,465.57 319.03,478.02 329.45,477.01 339.87,465.09 350.29,445.23 360.71,425.06 371.13,410.59 381.56,401.88 391.98,397.57 402.40,396.89 412.82,399.22 423.24,403.84 433.66,410.31 444.08,417.78 454.51,425.47 464.93,431.26 475.35,430.93 485.77,422.74 496.19,413.03 506.61,410.59 517.03,416.77 527.46,424.53 537.88,427.32 548.30,424.24 558.72,415.78 569.14,402.53 579.56,387.87 589.98,376.74 600.41,370.54 610.83,367.00 621.25,363.82 631.67,360.60 642.09,357.45 652.51,354.62 662.93,354.01 673.36,358.66 683.78,366.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,201.46 79.33,204.68 89.75,207.73 100.18,210.97 110.60,218.20 121.02,231.04 131.44,240.47 141.86,232.89 152.28,207.14 162.70,183.73 173.13,183.24 183.55,205.77 193.97,240.71 204.39,280.37 214.81,316.98 225.23,339.09 235.66,343.71 246.08,342.08 256.50,346.48 266.92,358.56 277.34,374.90 287.76,392.76 298.18,408.39 308.61,415.64 319.03,412.77 329.45,407.70 339.87,409.72 350.29,419.46 360.71,430.82 371.13,438.97 381.56,444.19 391.98,448.22 402.40,451.81 412.82,453.94 423.24,453.28 433.66,449.79 444.08,444.77 454.51,439.35 464.93,434.50 475.35,431.89 485.77,432.47 496.19,436.04 506.61,442.27 517.03,450.08 527.46,455.38 537.88,454.39 548.30,447.16 558.72,435.31 569.14,419.96 579.56,402.74 589.98,385.93 600.41,371.07 610.83,361.48 621.25,360.43 631.67,365.17 642.09,366.96 652.51,360.04 662.93,346.53 673.36,330.58 683.78,317.78 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,264.58 79.33,274.49 89.75,269.86 100.18,247.05 110.60,217.68 121.02,189.48 131.44,168.22 141.86,161.69 152.28,171.55 162.70,191.05 173.13,213.33 183.55,235.14 193.97,251.61 204.39,259.90 214.81,266.81 225.23,283.69 235.66,313.61 246.08,345.93 256.50,369.08 266.92,382.20 277.34,390.72 287.76,398.65 298.18,406.97 308.61,416.71 319.03,427.62 329.45,434.92 339.87,433.05 350.29,423.66 360.71,417.21 371.13,421.79 381.56,432.87 391.98,439.81 402.40,437.49 412.82,429.26 423.24,419.60 433.66,411.36 444.08,410.12 454.51,420.48 464.93,437.12 475.35,447.32 485.77,444.71 496.19,437.54 506.61,437.55 517.03,446.20 527.46,452.62 537.88,446.78 548.30,430.10 558.72,409.97 569.14,391.21 579.56,377.01 589.98,371.59 600.41,375.37 610.83,382.41 621.25,386.79 631.67,388.31 642.09,389.57 652.51,392.25 662.93,395.87 673.36,399.41 683.78,401.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,106.48 79.33,116.77 89.75,135.69 100.18,159.64 110.60,182.46 121.02,200.41 131.44,214.04 141.86,224.58 152.28,232.98 162.70,241.62 173.13,252.88 183.55,266.75 193.97,281.90 204.39,297.22 214.81,309.14 225.23,312.07 235.66,305.34 246.08,299.12 256.50,304.42 266.92,321.69 277.34,344.73 287.76,368.85 298.18,391.72 308.61,410.08 319.03,422.44 329.45,429.31 339.87,431.30 350.29,429.84 360.71,428.99 371.13,431.94 381.56,437.57 391.98,442.99 402.40,446.88 412.82,450.74 423.24,456.51 433.66,463.66 444.08,467.86 454.51,465.51 464.93,458.75 475.35,453.25 485.77,451.83 496.19,450.81 506.61,444.91 517.03,433.68 527.46,422.84 537.88,417.66 548.30,416.75 558.72,414.73 569.14,408.30 579.56,397.76 589.98,383.84 600.41,367.21 610.83,349.73 621.25,333.23 631.67,318.44 642.09,306.22 652.51,297.21 662.93,291.86 673.36,290.83 683.78,292.72 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,301.61 79.33,275.28 89.75,249.22 100.18,230.99 110.60,214.73 121.02,196.96 131.44,179.55 141.86,165.64 152.28,157.56 162.70,160.99 173.13,181.51 183.55,214.32 193.97,243.85 204.39,259.93 214.81,267.46 225.23,275.79 235.66,289.21 246.08,309.44 256.50,338.22 266.92,374.38 277.34,413.23 287.76,451.09 298.18,482.79 308.61,499.93 319.03,499.52 329.45,488.26 339.87,474.12 350.29,461.12 360.71,455.65 371.13,462.52 381.56,476.18 391.98,484.78 402.40,482.39 412.82,470.60 423.24,451.76 433.66,427.73 444.08,402.90 454.51,381.06 464.93,364.25 475.35,355.62 485.77,356.67 496.19,364.80 506.61,376.33 517.03,389.32 527.46,400.79 537.88,407.99 548.30,411.31 558.72,412.72 569.14,413.35 579.56,412.09 589.98,407.17 600.41,398.68 610.83,390.47 621.25,386.36 631.67,386.27 642.09,388.02 652.51,389.91 662.93,388.82 673.36,379.95 683.78,367.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,364.67 79.33,355.99 89.75,335.64 100.18,305.91 110.60,273.58 121.02,242.74 131.44,211.67 141.86,177.41 152.28,141.49 162.70,117.24 173.13,118.01 183.55,142.90 193.97,182.42 204.39,229.74 214.81,278.21 225.23,318.08 235.66,345.99 246.08,366.88 256.50,386.14 266.92,404.45 277.34,420.08 287.76,431.78 298.18,439.75 308.61,444.60 319.03,446.38 329.45,443.56 339.87,434.34 350.29,419.85 360.71,405.38 371.13,395.19 381.56,391.09 391.98,395.55 402.40,408.85 412.82,422.68 423.24,426.56 433.66,419.05 444.08,406.61 454.51,394.85 464.93,386.21 475.35,384.07 485.77,390.12 496.19,401.86 506.61,415.81 517.03,429.09 527.46,434.51 537.88,425.56 548.30,407.09 558.72,393.02 569.14,391.64 579.56,399.03 589.98,408.60 600.41,417.52 610.83,424.35 621.25,427.70 631.67,429.83 642.09,437.22 652.51,453.78 662.93,472.62 673.36,482.18 683.78,481.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,109.35 79.33,122.24 89.75,134.06 100.18,139.85 110.60,140.28 121.02,136.55 131.44,138.20 141.86,159.32 152.28,201.17 162.70,242.92 173.13,263.70 183.55,267.54 193.97,275.97 204.39,302.88 214.81,338.31 225.23,364.24 235.66,374.23 246.08,375.70 256.50,376.83 266.92,379.74 277.34,385.02 287.76,393.02 298.18,402.12 308.61,409.40 319.03,413.54 329.45,414.81 339.87,413.59 350.29,411.38 360.71,412.77 371.13,421.23 381.56,432.34 391.98,436.72 402.40,430.24 412.82,418.68 423.24,409.55 433.66,405.55 444.08,408.22 454.51,418.75 464.93,433.22 475.35,442.94 485.77,443.29 496.19,437.09 506.61,428.59 517.03,419.84 527.46,413.49 537.88,411.94 548.30,413.23 558.72,411.77 569.14,404.41 579.56,394.47 589.98,387.21 600.41,384.59 610.83,386.51 621.25,392.80 631.67,400.19 642.09,400.32 652.51,388.11 662.93,371.35 673.36,363.24 683.78,365.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,213.46 79.33,228.20 89.75,241.96 100.18,249.21 110.60,250.78 121.02,247.41 131.44,241.79 141.86,237.85 152.28,237.05 162.70,239.22 173.13,244.17 183.55,251.99 193.97,263.07 204.39,277.37 214.81,290.46 225.23,295.16 235.66,290.25 246.08,286.52 256.50,295.68 266.92,317.74 277.34,344.74 287.76,370.70 298.18,392.95 308.61,407.89 319.03,414.36 329.45,416.14 339.87,417.67 350.29,419.39 360.71,418.83 371.13,414.17 381.56,408.82 391.98,409.81 402.40,420.15 412.82,434.75 423.24,447.04 433.66,455.15 444.08,459.56 454.51,460.73 464.93,461.17 475.35,466.02 485.77,477.44 496.19,488.30 506.61,488.71 517.03,477.41 527.46,463.52 537.88,455.41 548.30,450.85 558.72,441.25 569.14,421.62 579.56,395.70 589.98,369.55 600.41,345.82 610.83,326.19 621.25,312.34 631.67,304.04 642.09,299.84 652.51,298.65 662.93,298.84 673.36,297.91 683.78,295.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,263.71 79.33,264.97 89.75,256.73 100.18,240.18 110.60,226.62 121.02,222.70 131.44,223.97 141.86,223.09 152.28,219.26 162.70,222.69 173.13,243.55 183.55,277.76 193.97,309.25 204.39,327.30 214.81,334.28 225.23,335.49 235.66,333.32 246.08,328.53 256.50,321.90 266.92,315.74 277.34,316.24 287.76,327.78 298.18,347.14 308.61,367.85 319.03,387.18 329.45,407.48 339.87,431.57 350.29,456.30 360.71,468.83 371.13,459.36 381.56,437.02 391.98,421.75 402.40,423.09 412.82,434.39 423.24,446.79 433.66,456.67 444.08,460.48 454.51,455.32 464.93,443.78 475.35,432.33 485.77,424.48 496.19,418.97 506.61,413.80 517.03,408.95 527.46,407.28 537.88,411.40 548.30,418.93 558.72,423.31 569.14,420.72 579.56,414.07 589.98,408.08 600.41,404.24 610.83,401.09 621.25,397.11 631.67,391.97 642.09,385.55 652.51,377.83 662.93,369.59 673.36,362.14 683.78,357.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,78.08 79.33,104.68 89.75,123.85 100.18,126.86 110.60,122.63 121.02,117.23 131.44,116.43 141.86,128.18 152.28,153.06 162.70,178.43 173.13,191.68 183.55,196.88 193.97,211.38 204.39,246.40 214.81,294.68 225.23,342.97 235.66,384.88 246.08,416.37 256.50,433.25 266.92,436.14 277.34,429.84 287.76,418.19 298.18,408.18 308.61,411.33 319.03,431.00 329.45,452.74 339.87,459.53 350.29,450.11 360.71,435.25 371.13,423.47 381.56,414.96 391.98,407.99 402.40,401.73 412.82,396.47 423.24,392.66 433.66,391.50 444.08,397.09 454.51,412.76 464.93,434.20 475.35,451.20 485.77,457.92 496.19,453.95 506.61,439.17 517.03,415.73 527.46,393.09 537.88,379.96 548.30,376.44 558.72,379.23 569.14,386.13 579.56,395.14 589.98,403.53 600.41,409.92 610.83,412.58 621.25,409.84 631.67,403.99 642.09,401.88 652.51,407.69 662.93,415.57 673.36,415.57 683.78,408.49 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,89.98 79.33,104.33 89.75,124.21 100.18,146.39 110.60,171.74 121.02,200.46 131.44,228.50 141.86,249.84 152.28,262.64 162.70,269.34 173.13,272.40 183.55,271.62 193.97,265.16 204.39,252.57 214.81,245.31 225.23,261.98 235.66,306.17 246.08,352.31 256.50,372.65 266.92,368.41 277.34,362.00 287.76,369.65 298.18,386.94 308.61,403.13 319.03,413.21 329.45,417.45 339.87,416.36 350.29,412.29 360.71,412.63 371.13,423.06 381.56,440.07 391.98,455.47 402.40,464.82 412.82,466.28 423.24,457.79 433.66,441.81 444.08,429.97 454.51,432.08 464.93,444.33 475.35,455.66 485.77,459.72 496.19,456.21 506.61,445.14 517.03,428.51 527.46,414.94 537.88,412.30 548.30,417.72 558.72,421.40 569.14,417.62 579.56,410.65 589.98,407.40 600.41,409.70 610.83,413.59 621.25,415.07 631.67,412.83 642.09,405.56 652.51,392.64 662.93,378.36 673.36,369.68 683.78,367.92 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,230.56 79.33,232.06 89.75,224.98 100.18,210.43 110.60,199.04 121.02,197.32 131.44,203.75 141.86,215.41 152.28,230.37 162.70,244.51 173.13,253.78 183.55,259.61 193.97,267.93 204.39,282.41 214.81,298.15 225.23,306.73 235.66,306.06 246.08,305.03 256.50,313.31 266.92,330.30 277.34,347.65 287.76,359.33 298.18,366.98 308.61,374.54 319.03,383.87 329.45,394.87 339.87,407.38 350.29,420.40 360.71,430.84 371.13,436.37 381.56,440.41 391.98,450.08 402.40,468.29 412.82,488.69 423.24,503.11 433.66,509.32 444.08,508.32 454.51,500.96 464.93,487.83 475.35,469.86 485.77,448.00 496.19,426.37 506.61,410.50 517.03,401.86 527.46,398.70 537.88,399.36 548.30,401.76 558.72,401.74 569.14,396.94 579.56,389.64 589.98,383.49 600.41,379.15 610.83,373.03 621.25,361.57 631.67,347.18 642.09,337.96 652.51,339.05 662.93,345.98 673.36,350.86 683.78,351.51 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,125.90 79.33,141.36 89.75,166.04 100.18,195.09 110.60,223.62 121.02,248.13 131.44,263.28 141.86,261.50 152.28,242.89 162.70,222.67 173.13,216.09 183.55,222.27 193.97,230.87 204.39,235.35 214.81,242.43 225.23,263.89 235.66,302.29 246.08,343.19 256.50,370.90 266.92,384.85 277.34,394.09 287.76,405.15 298.18,416.08 308.61,422.28 319.03,422.15 329.45,419.54 339.87,419.01 350.29,421.28 360.71,424.73 371.13,428.04 381.56,431.05 391.98,433.69 402.40,435.77 412.82,435.68 423.24,431.44 433.66,423.71 444.08,417.16 454.51,415.79 464.93,418.87 475.35,423.63 485.77,428.40 496.19,432.16 506.61,433.65 517.03,432.97 527.46,432.40 537.88,434.05 548.30,437.16 558.72,439.14 569.14,438.31 579.56,433.59 589.98,423.57 600.41,408.66 610.83,393.55 621.25,382.88 631.67,375.21 642.09,364.36 652.51,346.36 662.93,323.69 673.36,300.86 683.78,284.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,207.94 79.33,201.98 89.75,203.36 100.18,212.33 110.60,218.44 121.02,215.63 131.44,209.38 141.86,208.45 152.28,215.58 162.70,227.57 173.13,241.15 183.55,255.66 193.97,271.07 204.39,287.28 214.81,302.60 225.23,314.31 235.66,322.20 246.08,331.71 256.50,348.72 266.92,372.29 277.34,395.57 287.76,413.55 298.18,426.31 308.61,434.88 319.03,440.21 329.45,445.46 339.87,454.25 350.29,464.87 360.71,468.49 371.13,458.29 381.56,439.15 391.98,422.09 402.40,412.56 412.82,408.56 423.24,407.23 433.66,407.73 444.08,410.00 454.51,414.05 464.93,420.19 475.35,429.07 485.77,440.65 496.19,450.94 506.61,454.44 517.03,449.55 527.46,437.41 537.88,419.12 548.30,398.61 558.72,384.52 569.14,381.67 579.56,383.47 589.98,379.75 600.41,367.85 610.83,353.97 621.25,344.29 631.67,339.08 642.09,335.83 652.51,332.87 662.93,330.53 673.36,329.53 683.78,329.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,231.01 79.33,203.50 89.75,168.77 100.18,139.82 110.60,128.44 121.02,141.29 131.44,170.10 141.86,201.91 152.28,230.63 162.70,250.80 173.13,257.10 183.55,253.86 193.97,255.27 204.39,270.55 214.81,293.87 225.23,314.57 235.66,328.41 246.08,337.42 256.50,343.86 266.92,350.84 277.34,365.83 287.76,393.96 298.18,428.74 308.61,457.82 319.03,475.18 329.45,479.64 339.87,470.04 350.29,449.55 360.71,429.59 371.13,419.18 381.56,417.17 391.98,419.23 402.40,422.96 412.82,427.15 423.24,430.39 433.66,432.96 444.08,437.50 454.51,446.18 464.93,456.08 475.35,460.35 485.77,455.47 496.19,445.11 506.61,434.51 517.03,424.69 527.46,412.38 537.88,394.61 548.30,375.44 558.72,365.53 569.14,370.96 579.56,385.81 589.98,400.68 600.41,411.70 610.83,417.41 621.25,416.43 631.67,410.83 642.09,406.69 652.51,407.85 662.93,411.16 673.36,411.01 683.78,407.47 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,269.82 79.33,248.86 89.75,223.26 100.18,198.01 110.60,169.78 121.02,137.63 131.44,114.93 141.86,121.66 152.28,161.06 162.70,210.67 173.13,247.86 183.55,270.01 193.97,282.11 204.39,288.04 214.81,295.15 225.23,314.80 235.66,349.97 246.08,389.78 256.50,422.34 266.92,445.31 277.34,459.84 287.76,466.71 298.18,464.31 308.61,449.65 319.03,422.45 329.45,390.34 339.87,362.30 350.29,342.11 360.71,334.43 371.13,342.78 381.56,362.79 391.98,385.25 402.40,405.30 412.82,422.43 423.24,436.23 433.66,446.93 444.08,455.78 454.51,463.87 464.93,470.76 475.35,475.21 485.77,476.49 496.19,474.29 506.61,468.25 517.03,458.66 527.46,447.34 537.88,435.93 548.30,424.10 558.72,410.44 569.14,394.30 579.56,378.55 589.98,367.47 600.41,362.27 610.83,360.82 621.25,360.94 631.67,359.91 642.09,351.79 652.51,333.02 662.93,309.78 673.36,292.41 683.78,284.90 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,77.27 79.33,75.90 89.75,68.75 100.18,61.23 110.60,69.48 121.02,102.61 131.44,149.67 141.86,193.45 152.28,226.61 162.70,245.71 173.13,247.47 183.55,238.14 193.97,235.86 204.39,252.43 214.81,280.92 225.23,308.49 235.66,330.12 246.08,348.63 256.50,367.16 266.92,385.52 277.34,400.97 287.76,411.47 298.18,416.35 308.61,414.84 319.03,407.00 329.45,395.91 339.87,385.13 350.29,376.98 360.71,375.94 371.13,385.39 381.56,401.22 391.98,414.71 402.40,421.77 412.82,425.98 423.24,432.10 433.66,440.95 444.08,450.25 454.51,457.96 464.93,462.05 475.35,458.84 485.77,446.91 496.19,432.80 506.61,425.53 517.03,426.66 527.46,429.82 537.88,429.06 548.30,424.02 558.72,416.20 569.14,406.66 579.56,396.86 589.98,388.87 600.41,384.12 610.83,385.75 621.25,396.85 631.67,414.65 642.09,430.32 652.51,438.10 662.93,440.31 673.36,441.45 683.78,442.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,475.09 79.33,422.88 89.75,360.55 100.18,307.84 110.60,272.66 121.02,258.98 131.44,255.85 141.86,246.52 152.28,226.54 162.70,205.92 173.13,194.80 183.55,195.68 193.97,209.75 204.39,237.45 214.81,273.39 225.23,308.83 235.66,339.83 246.08,365.39 256.50,384.52 266.92,397.01 277.34,402.91 287.76,402.45 298.18,399.13 308.61,399.04 319.03,404.62 329.45,412.73 339.87,419.66 350.29,426.00 360.71,436.99 371.13,456.53 381.56,478.66 391.98,490.92 402.40,487.49 412.82,473.34 423.24,455.08 433.66,435.71 444.08,418.93 454.51,407.93 464.93,403.31 475.35,405.32 485.77,413.67 496.19,424.02 506.61,430.46 517.03,431.50 527.46,429.38 537.88,426.19 548.30,422.20 558.72,417.19 569.14,411.07 579.56,404.28 589.98,397.48 600.41,390.81 610.83,383.76 621.25,375.82 631.67,367.47 642.09,360.24 652.51,355.15 662.93,352.01 673.36,350.34 683.78,349.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,284.45 79.33,274.00 89.75,241.59 100.18,193.07 110.60,149.98 121.02,125.80 131.44,121.19 141.86,135.74 152.28,166.44 162.70,199.03 173.13,219.22 183.55,228.50 193.97,238.26 204.39,256.10 214.81,280.30 225.23,307.07 235.66,334.50 246.08,360.86 256.50,384.33 266.92,404.18 277.34,419.42 287.76,429.44 298.18,435.63 308.61,440.56 319.03,444.77 329.45,443.59 339.87,431.56 350.29,410.83 360.71,393.35 371.13,388.47 381.56,393.59 391.98,401.54 402.40,408.39 412.82,412.73 423.24,413.00 433.66,409.16 444.08,402.94 454.51,395.86 464.93,389.12 475.35,384.81 485.77,384.36 496.19,390.05 506.61,404.90 517.03,427.29 527.46,445.84 537.88,450.11 548.30,442.14 558.72,430.88 569.14,421.59 579.56,410.77 589.98,392.77 600.41,367.46 610.83,345.05 621.25,335.70 631.67,338.27 642.09,344.54 652.51,348.92 662.93,350.42 673.36,348.21 683.78,344.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,123.28 79.33,160.14 89.75,196.72 100.18,219.35 110.60,228.90 121.02,226.28 131.44,215.87 141.86,204.05 152.28,193.85 162.70,188.11 173.13,189.62 183.55,200.20 193.97,223.06 204.39,259.78 214.81,301.74 225.23,334.76 235.66,353.76 246.08,364.56 256.50,373.57 266.92,381.98 277.34,388.87 287.76,393.63 298.18,397.38 308.61,402.20 319.03,408.74 329.45,414.86 339.87,417.99 350.29,418.70 360.71,421.11 371.13,428.40 381.56,438.83 391.98,448.26 402.40,454.17 412.82,453.47 423.24,442.41 433.66,422.10 444.08,401.03 454.51,386.47 464.93,379.48 475.35,379.99 485.77,387.66 496.19,399.37 506.61,410.91 517.03,420.10 527.46,423.72 537.88,418.89 548.30,408.16 558.72,398.67 569.14,394.77 579.56,395.59 589.98,399.44 600.41,404.73 610.83,406.74 621.25,400.83 631.67,388.19 642.09,374.33 652.51,363.04 662.93,355.18 673.36,351.68 683.78,351.73 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,219.82 79.33,218.54 89.75,207.06 100.18,187.64 110.60,172.44 121.02,168.83 131.44,174.23 141.86,184.04 152.28,196.63 162.70,212.71 173.13,232.97 183.55,254.59 193.97,269.85 204.39,273.85 214.81,271.67 225.23,272.15 235.66,279.51 246.08,296.08 256.50,324.33 266.92,361.17 277.34,395.98 287.76,420.97 298.18,436.06 308.61,442.53 319.03,441.89 329.45,440.30 339.87,444.91 350.29,455.49 360.71,465.01 371.13,467.83 381.56,462.95 391.98,449.74 402.40,429.05 412.82,410.43 423.24,405.85 433.66,415.68 444.08,427.60 454.51,431.08 464.93,425.71 475.35,413.88 485.77,397.52 496.19,381.94 506.61,374.29 517.03,375.40 527.46,378.42 537.88,377.07 548.30,373.94 558.72,377.55 569.14,392.64 579.56,412.98 589.98,428.89 600.41,437.27 610.83,441.25 621.25,443.96 631.67,444.94 642.09,441.40 652.51,431.70 662.93,419.23 673.36,409.65 683.78,405.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,271.47 79.33,256.75 89.75,245.99 100.18,244.21 110.60,246.95 121.02,251.01 131.44,251.24 141.86,240.28 152.28,218.39 162.70,200.97 173.13,203.47 183.55,222.64 193.97,241.89 204.39,250.55 214.81,256.88 225.23,275.70 235.66,311.25 246.08,351.09 256.50,381.66 266.92,400.68 277.34,410.65 287.76,413.54 298.18,411.85 308.61,409.66 319.03,409.10 329.45,411.81 339.87,419.62 350.29,430.33 360.71,435.11 371.13,427.22 381.56,412.90 391.98,405.78 402.40,412.12 412.82,425.29 423.24,436.58 433.66,443.33 444.08,445.41 454.51,442.79 464.93,437.50 475.35,433.88 485.77,434.26 496.19,437.36 506.61,441.28 517.03,444.34 527.46,442.15 537.88,430.76 548.30,413.61 558.72,400.33 569.14,396.50 579.56,397.70 589.98,396.78 600.41,391.78 610.83,386.45 621.25,384.50 631.67,384.05 642.09,378.25 652.51,362.89 662.93,343.73 673.36,330.59 683.78,326.30 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,322.94 79.33,304.48 89.75,280.08 100.18,256.20 110.60,236.34 121.02,222.42 131.44,211.71 141.86,199.93 152.28,187.42 162.70,184.30 173.13,200.61 183.55,232.98 193.97,267.25 204.39,293.57 214.81,308.08 225.23,305.96 235.66,288.49 246.08,275.31 256.50,287.63 266.92,324.43 277.34,368.27 287.76,406.13 298.18,434.00 308.61,447.16 319.03,444.11 329.45,429.81 339.87,410.14 350.29,390.10 360.71,381.12 371.13,391.94 381.56,415.65 391.98,436.83 402.40,447.70 412.82,450.10 423.24,446.74 433.66,439.95 444.08,435.36 454.51,437.70 464.93,444.05 475.35,446.77 485.77,441.65 496.19,429.94 506.61,413.68 517.03,394.77 527.46,378.45 537.88,369.57 548.30,368.90 558.72,376.31 569.14,391.30 579.56,408.75 589.98,421.14 600.41,426.14 610.83,426.35 621.25,424.45 631.67,422.09 642.09,422.24 652.51,426.78 662.93,433.76 673.36,439.82 683.78,443.17 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,290.85 79.33,272.68 89.75,245.11 100.18,213.40 110.60,181.03 121.02,150.87 131.44,130.84 141.86,132.45 152.28,156.32 162.70,183.17 173.13,193.71 183.55,191.33 193.97,195.16 204.39,217.61 214.81,250.82 225.23,280.42 235.66,302.00 246.08,325.69 256.50,362.53 266.92,408.94 277.34,446.94 287.76,463.50 298.18,461.23 308.61,447.13 319.03,426.14 329.45,409.56 339.87,410.37 350.29,427.52 360.71,446.03 371.13,454.09 381.56,453.12 391.98,448.65 402.40,443.50 412.82,437.39 423.24,429.77 433.66,421.46 444.08,416.14 454.51,416.91 464.93,422.03 475.35,426.83 485.77,428.65 496.19,427.09 506.61,421.86 517.03,413.78 527.46,406.88 537.88,404.83 548.30,404.87 558.72,399.08 569.14,383.32 579.56,366.30 589.98,361.30 600.41,371.56 610.83,387.92 621.25,401.20 631.67,410.81 642.09,419.92 652.51,430.59 662.93,441.68 673.36,451.11 683.78,456.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,97.07 79.33,103.59 89.75,113.37 100.18,125.53 110.60,141.23 121.02,161.16 131.44,184.67 141.86,210.74 152.28,237.67 162.70,258.89 173.13,267.92 183.55,267.68 193.97,269.30 204.39,280.16 214.81,298.15 225.23,318.81 235.66,340.16 246.08,361.74 256.50,383.11 266.92,403.92 277.34,423.51 287.76,441.17 298.18,453.10 308.61,452.70 319.03,438.63 329.45,423.10 339.87,420.40 350.29,430.41 360.71,440.20 371.13,439.69 381.56,433.05 391.98,430.73 402.40,437.28 412.82,445.63 423.24,446.65 433.66,438.58 444.08,425.24 454.51,409.98 464.93,394.54 475.35,381.57 485.77,372.84 496.19,370.97 506.61,379.38 517.03,397.22 527.46,415.85 537.88,427.25 548.30,431.16 558.72,430.14 569.14,425.79 579.56,418.29 589.98,407.77 600.41,395.21 610.83,385.25 621.25,382.47 631.67,384.05 642.09,380.37 652.51,365.16 662.93,341.81 673.36,316.56 683.78,297.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,178.07 79.33,176.82 89.75,181.60 100.18,190.83 110.60,195.01 121.02,188.73 131.44,178.11 141.86,172.81 152.28,176.59 162.70,189.63 173.13,212.03 183.55,241.56 193.97,272.42 204.39,300.37 214.81,321.42 225.23,329.69 235.66,324.74 246.08,318.67 256.50,324.56 266.92,342.73 277.34,365.16 287.76,385.87 298.18,402.99 308.61,414.36 319.03,419.65 329.45,423.61 339.87,431.83 350.29,443.95 360.71,453.85 371.13,456.69 381.56,452.60 391.98,442.97 402.40,429.12 412.82,415.60 423.24,408.13 433.66,407.72 444.08,411.70 454.51,417.71 464.93,423.19 475.35,423.48 485.77,416.38 496.19,406.20 506.61,399.01 517.03,396.77 527.46,398.99 537.88,405.19 548.30,413.53 558.72,419.92 569.14,421.87 579.56,419.44 589.98,413.00 600.41,403.62 610.83,395.92 621.25,394.47 631.67,397.97 642.09,400.68 652.51,398.83 662.93,393.49 673.36,386.85 683.78,381.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,161.95 79.33,166.37 89.75,180.19 100.18,203.40 110.60,232.64 121.02,264.87 131.44,288.83 141.86,288.08 152.28,260.10 162.70,224.01 173.13,199.11 183.55,190.08 193.97,199.01 204.39,226.82 214.81,265.96 225.23,304.11 235.66,335.52 246.08,357.37 256.50,366.78 266.92,366.58 277.34,367.01 287.76,375.46 298.18,389.57 308.61,403.88 319.03,415.69 329.45,424.32 339.87,429.04 350.29,429.63 360.71,425.97 371.13,418.14 381.56,410.68 391.98,412.32 402.40,426.58 412.82,445.50 423.24,458.82 433.66,463.44 444.08,459.41 454.51,446.95 464.93,431.01 475.35,422.07 485.77,425.44 496.19,435.10 506.61,442.44 517.03,444.90 527.46,444.03 537.88,441.31 548.30,436.65 558.72,429.24 569.14,418.58 579.56,404.78 589.98,388.04 600.41,369.35 610.83,353.35 621.25,344.62 631.67,341.68 642.09,338.36 652.51,330.60 662.93,319.72 673.36,308.39 683.78,299.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,273.79 79.33,248.95 89.75,222.25 100.18,201.66 110.60,185.22 121.02,171.95 131.44,164.86 141.86,168.51 152.28,183.18 162.70,201.41 173.13,215.71 183.55,227.45 193.97,244.16 204.39,270.53 214.81,300.72 225.23,324.63 235.66,338.33 246.08,343.98 256.50,344.05 266.92,341.93 277.34,345.92 287.76,361.71 298.18,382.38 308.61,394.68 319.03,393.60 329.45,387.70 339.87,387.19 350.29,393.21 360.71,400.67 371.13,405.58 381.56,409.99 391.98,418.77 402.40,433.66 412.82,448.12 423.24,453.79 433.66,450.39 444.08,446.25 454.51,448.43 464.93,453.94 475.35,454.30 485.77,445.28 496.19,432.74 506.61,424.97 517.03,424.04 527.46,426.70 537.88,429.92 548.30,433.06 558.72,435.88 569.14,438.08 579.56,437.94 589.98,432.93 600.41,421.83 610.83,403.46 621.25,376.69 631.67,345.11 642.09,318.71 652.51,304.03 662.93,299.27 673.36,300.63 683.78,304.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,182.68 79.33,192.15 89.75,199.47 100.18,202.07 110.60,204.04 121.02,208.00 131.44,214.75 141.86,225.18 152.28,238.12 162.70,245.85 173.13,240.73 183.55,226.22 193.97,215.46 204.39,217.54 214.81,235.45 225.23,272.76 235.66,327.49 246.08,379.02 256.50,405.08 266.92,406.33 277.34,399.82 287.76,398.10 298.18,402.08 308.61,411.09 319.03,423.81 329.45,433.42 339.87,432.00 350.29,420.05 360.71,406.23 371.13,397.47 381.56,395.83 391.98,403.60 402.40,421.29 412.82,443.21 423.24,462.18 433.66,475.46 444.08,480.92 454.51,476.80 464.93,464.90 475.35,449.57 485.77,433.50 496.19,418.55 506.61,407.12 517.03,400.25 527.46,398.89 537.88,403.85 548.30,411.66 558.72,413.82 569.14,405.52 579.56,391.69 589.98,380.09 600.41,373.42 610.83,370.29 621.25,369.25 631.67,368.15 642.09,362.15 652.51,348.21 662.93,329.34 673.36,310.77 683.78,297.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,115.15 79.33,146.68 89.75,169.74 100.18,178.47 110.60,193.86 121.02,227.86 131.44,267.49 141.86,292.22 152.28,295.47 162.70,284.01 173.13,264.77 183.55,242.72 193.97,227.24 204.39,224.80 214.81,237.44 225.23,267.58 235.66,313.21 246.08,356.69 256.50,378.94 266.92,381.44 277.34,381.45 287.76,391.37 298.18,406.90 308.61,418.19 319.03,421.01 329.45,418.48 339.87,414.36 350.29,410.64 360.71,410.55 371.13,416.60 381.56,427.85 391.98,441.84 402.40,456.72 412.82,467.74 423.24,469.03 433.66,461.52 444.08,455.40 454.51,459.28 464.93,469.55 475.35,475.90 485.77,472.68 496.19,461.76 506.61,446.10 517.03,428.07 527.46,413.41 537.88,407.39 548.30,408.86 558.72,413.03 569.14,416.66 579.56,416.67 589.98,408.83 600.41,392.15 610.83,369.76 621.25,344.81 631.67,318.29 642.09,291.16 652.51,264.36 662.93,242.31 673.36,231.98 683.78,232.52 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,225.20 79.33,233.00 89.75,245.86 100.18,257.53 110.60,256.31 121.02,235.63 131.44,204.57 141.86,177.28 152.28,159.82 162.70,155.17 173.13,166.20 183.55,189.22 193.97,213.03 204.39,230.45 214.81,247.24 225.23,273.66 235.66,312.24 246.08,351.87 256.50,380.48 266.92,396.62 277.34,404.24 287.76,406.42 298.18,406.47 308.61,409.63 319.03,417.80 329.45,427.10 339.87,432.89 350.29,435.11 360.71,437.62 371.13,443.38 381.56,450.15 391.98,452.96 402.40,449.61 412.82,443.31 423.24,438.24 433.66,435.14 444.08,432.05 454.51,427.31 464.93,420.69 475.35,412.27 485.77,402.34 496.19,393.09 506.61,387.53 517.03,387.16 527.46,394.09 537.88,410.13 548.30,429.86 558.72,439.92 569.14,432.62 579.56,414.87 589.98,397.64 600.41,385.07 610.83,376.93 621.25,372.94 631.67,372.82 642.09,375.99 652.51,382.05 662.93,390.42 673.36,400.23 683.78,408.52 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,189.15 79.33,200.85 89.75,215.93 100.18,227.47 110.60,226.94 121.02,209.90 131.44,186.75 141.86,173.43 152.28,175.11 162.70,186.81 173.13,203.51 183.55,225.10 193.97,253.97 204.39,291.03 214.81,325.79 225.23,341.13 235.66,332.69 246.08,317.76 256.50,315.16 266.92,326.93 277.34,346.23 287.76,367.89 298.18,388.61 308.61,403.58 319.03,410.55 329.45,409.83 339.87,401.88 350.29,390.50 360.71,387.88 371.13,403.50 381.56,432.67 391.98,464.15 402.40,491.70 412.82,512.04 423.24,521.37 433.66,519.07 444.08,507.14 454.51,487.40 464.93,462.85 475.35,439.31 485.77,420.17 496.19,406.48 506.61,399.42 517.03,398.24 527.46,398.05 537.88,394.33 548.30,387.45 558.72,380.07 569.14,373.79 579.56,368.25 589.98,362.78 600.41,357.10 610.83,351.26 621.25,345.31 631.67,339.83 642.09,336.30 652.51,335.45 662.93,333.48 673.36,324.21 683.78,311.19 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,63.82 79.33,72.37 89.75,91.71 100.18,118.68 110.60,144.99 121.02,165.46 131.44,180.13 141.86,189.54 152.28,195.01 162.70,202.00 173.13,215.95 183.55,235.38 193.97,253.59 204.39,266.21 214.81,276.10 225.23,288.48 235.66,305.58 246.08,327.40 256.50,353.88 266.92,384.27 277.34,416.44 287.76,448.48 298.18,474.07 308.61,482.40 319.03,469.93 329.45,447.25 339.87,426.89 350.29,412.23 360.71,403.46 371.13,400.66 381.56,402.37 391.98,405.79 402.40,409.56 412.82,414.66 423.24,422.36 433.66,432.37 444.08,442.08 454.51,449.25 464.93,453.23 475.35,453.30 485.77,449.30 496.19,443.35 506.61,438.42 517.03,435.36 527.46,433.50 537.88,432.22 548.30,429.77 558.72,422.37 569.14,407.80 579.56,387.90 589.98,365.55 600.41,342.11 610.83,318.77 621.25,296.73 631.67,277.01 642.09,261.68 652.51,251.91 662.93,244.66 673.36,234.93 683.78,224.67 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,221.50 79.33,222.27 89.75,218.10 100.18,209.40 110.60,201.76 121.02,198.62 131.44,199.43 141.86,203.03 152.28,208.20 162.70,211.06 173.13,207.82 183.55,204.57 193.97,219.24 204.39,262.87 214.81,318.97 225.23,359.36 235.66,374.24 246.08,376.73 256.50,381.28 266.92,389.29 277.34,395.06 287.76,394.51 298.18,389.12 308.61,382.30 319.03,376.54 329.45,377.91 339.87,393.42 350.29,419.34 360.71,437.21 371.13,432.80 381.56,415.84 391.98,408.41 402.40,420.73 412.82,442.50 423.24,460.20 433.66,468.92 444.08,465.59 454.51,447.88 464.93,424.72 475.35,415.69 485.77,430.21 496.19,451.62 506.61,456.53 517.03,440.29 527.46,417.30 537.88,400.91 548.30,391.62 558.72,385.29 569.14,379.47 579.56,375.44 589.98,375.34 600.41,379.03 610.83,381.69 621.25,378.56 631.67,370.30 642.09,361.16 652.51,353.99 662.93,348.85 673.36,345.47 683.78,343.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,117.64 79.33,138.48 89.75,164.38 100.18,189.10 110.60,212.57 121.02,234.43 131.44,251.14 141.86,257.48 152.28,252.57 162.70,242.21 173.13,232.28 183.55,227.39 193.97,236.49 204.39,264.85 214.81,300.45 225.23,323.20 235.66,326.81 246.08,324.89 256.50,332.30 266.92,349.64 277.34,368.47 287.76,382.68 298.18,393.00 308.61,401.85 319.03,409.98 329.45,414.72 339.87,412.93 350.29,405.44 360.71,397.70 371.13,394.14 381.56,396.59 391.98,407.51 402.40,427.25 412.82,448.07 423.24,460.21 433.66,462.29 444.08,460.26 454.51,459.26 464.93,460.59 475.35,465.42 485.77,473.84 496.19,480.38 506.61,477.56 517.03,464.73 527.46,449.95 537.88,440.70 548.30,436.14 558.72,431.36 569.14,423.40 579.56,413.08 589.98,401.92 600.41,389.93 610.83,374.31 621.25,352.27 631.67,325.36 642.09,298.99 652.51,276.72 662.93,257.03 673.36,237.04 683.78,220.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,254.63 79.33,250.07 89.75,233.86 100.18,208.46 110.60,184.64 121.02,168.88 131.44,158.32 141.86,148.04 152.28,138.54 162.70,141.82 173.13,169.79 183.55,216.21 193.97,258.37 204.39,281.46 214.81,293.47 225.23,309.41 235.66,334.59 246.08,362.60 256.50,386.35 266.92,401.32 277.34,399.10 287.76,374.46 298.18,344.74 308.61,341.40 319.03,375.56 329.45,421.39 339.87,448.35 350.29,452.32 360.71,446.64 371.13,441.86 381.56,438.37 391.98,434.30 402.40,428.76 412.82,421.98 423.24,414.31 433.66,407.03 444.08,404.48 454.51,410.27 464.93,421.55 475.35,431.12 485.77,435.15 496.19,436.04 506.61,437.38 517.03,439.62 527.46,439.43 537.88,433.72 548.30,422.59 558.72,407.45 569.14,389.58 579.56,373.73 589.98,366.82 600.41,369.86 610.83,374.89 621.25,373.94 631.67,366.76 642.09,356.78 652.51,346.34 662.93,335.75 673.36,325.21 683.78,317.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,268.87 79.33,254.95 89.75,240.92 100.18,229.06 110.60,212.42 121.02,187.74 131.44,167.95 141.86,172.60 152.28,204.72 162.70,241.76 173.13,261.05 183.55,263.57 193.97,263.87 204.39,271.54 214.81,282.82 225.23,290.35 235.66,292.65 246.08,299.49 256.50,321.46 266.92,357.23 277.34,395.65 287.76,428.32 298.18,451.36 308.61,459.43 319.03,451.01 329.45,433.00 339.87,413.51 350.29,396.49 360.71,387.88 371.13,392.19 381.56,405.03 391.98,416.89 402.40,423.04 412.82,425.34 423.24,426.38 433.66,427.50 444.08,430.85 454.51,438.16 464.93,446.57 475.35,449.53 485.77,443.85 496.19,434.93 506.61,430.33 517.03,431.64 527.46,434.58 537.88,435.14 548.30,433.32 558.72,430.62 569.14,427.72 579.56,421.72 589.98,408.20 600.41,386.88 610.83,364.60 621.25,348.24 631.67,338.37 642.09,332.99 652.51,330.64 662.93,329.71 673.36,327.84 683.78,325.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,163.49 79.33,142.93 89.75,127.96 100.18,126.91 110.60,136.67 121.02,154.91 131.44,176.92 141.86,195.94 152.28,209.71 162.70,219.93 173.13,228.40 183.55,236.15 193.97,244.97 204.39,256.14 214.81,270.34 225.23,288.52 235.66,310.80 246.08,335.51 256.50,360.85 266.92,385.92 277.34,409.24 287.76,429.72 298.18,446.33 308.61,457.54 319.03,462.33 329.45,458.75 339.87,444.61 350.29,422.70 360.71,404.21 371.13,397.99 381.56,403.02 391.98,415.25 402.40,431.95 412.82,448.07 423.24,457.36 433.66,458.53 444.08,453.78 454.51,445.05 464.93,434.33 475.35,425.19 485.77,419.60 496.19,417.01 506.61,416.47 517.03,416.99 527.46,415.68 537.88,409.87 548.30,400.62 558.72,391.38 569.14,384.29 579.56,379.08 589.98,375.12 600.41,372.19 610.83,370.28 621.25,369.37 631.67,369.62 642.09,371.36 652.51,374.69 662.93,377.50 673.36,376.36 683.78,372.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,143.93 79.33,135.16 89.75,129.12 100.18,132.48 110.60,151.09 121.02,187.60 131.44,230.28 141.86,261.37 152.28,275.08 162.70,276.62 173.13,271.40 183.55,263.49 193.97,260.75 204.39,268.15 214.81,280.67 225.23,289.48 235.66,292.32 246.08,298.09 256.50,316.43 266.92,345.89 277.34,375.62 287.76,397.63 298.18,411.55 308.61,418.16 319.03,418.18 329.45,414.09 339.87,408.77 350.29,403.67 360.71,401.05 371.13,402.69 381.56,408.40 391.98,417.40 402.40,428.62 412.82,436.67 423.24,434.76 433.66,423.15 444.08,410.39 454.51,403.84 464.93,404.17 475.35,410.56 485.77,422.00 496.19,433.63 506.61,438.88 517.03,436.79 527.46,432.92 537.88,432.40 548.30,435.84 558.72,442.55 569.14,451.72 579.56,458.63 589.98,456.41 600.41,443.51 610.83,425.28 621.25,407.11 631.67,391.70 642.09,383.17 652.51,384.05 662.93,390.41 673.36,395.62 683.78,397.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,251.71 79.33,231.53 89.75,209.69 100.18,193.13 110.60,181.54 121.02,174.75 131.44,173.23 141.86,177.67 152.28,187.38 162.70,197.54 173.13,203.37 183.55,208.38 193.97,224.28 204.39,258.38 214.81,301.82 225.23,339.27 235.66,364.78 246.08,382.07 256.50,395.29 266.92,404.68 277.34,408.12 287.76,404.28 298.18,397.34 308.61,394.92 319.03,400.11 329.45,409.41 339.87,418.66 350.29,425.75 360.71,427.48 371.13,421.49 381.56,412.62 391.98,410.69 402.40,419.70 412.82,430.69 423.24,432.15 433.66,424.11 444.08,419.76 454.51,430.29 464.93,451.34 475.35,470.29 485.77,479.89 496.19,479.39 506.61,468.32 517.03,448.58 527.46,429.08 537.88,418.01 548.30,414.17 558.72,411.51 569.14,406.22 579.56,397.88 589.98,386.24 600.41,372.16 610.83,360.46 621.25,355.90 631.67,357.84 642.09,362.09 652.51,365.79 662.93,368.18 673.36,368.46 683.78,367.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,112.17 79.33,118.73 89.75,116.19 100.18,106.66 110.60,108.03 121.02,130.46 131.44,162.24 141.86,184.91 152.28,193.01 162.70,194.94 173.13,199.23 183.55,208.13 193.97,223.01 204.39,244.48 214.81,267.83 225.23,285.38 235.66,295.60 246.08,308.76 256.50,336.00 266.92,375.27 277.34,412.99 287.76,439.18 298.18,453.26 308.61,456.04 319.03,448.76 329.45,437.11 339.87,427.75 350.29,422.97 360.71,424.55 371.13,433.72 381.56,446.24 391.98,453.63 402.40,452.41 412.82,449.93 423.24,455.62 433.66,469.56 444.08,481.32 454.51,482.01 464.93,473.08 475.35,460.35 485.77,447.14 496.19,433.61 506.61,419.73 517.03,405.76 527.46,392.91 537.88,382.26 548.30,373.35 558.72,364.61 569.14,355.27 579.56,347.59 589.98,344.96 600.41,348.04 610.83,353.69 621.25,358.74 631.67,362.48 642.09,364.64 652.51,365.04 662.93,363.71 673.36,360.71 683.78,357.40 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,65.14 79.33,78.59 89.75,85.15 100.18,84.56 110.60,93.68 121.02,122.11 131.44,159.65 141.86,190.08 152.28,208.54 162.70,221.96 173.13,237.35 183.55,254.39 193.97,268.47 204.39,276.79 214.81,283.52 225.23,295.81 235.66,316.27 246.08,342.31 256.50,371.03 266.92,398.85 277.34,417.18 287.76,420.09 298.18,414.01 308.61,411.33 319.03,417.15 329.45,426.29 339.87,432.53 350.29,434.95 360.71,436.01 371.13,437.62 381.56,439.41 391.98,440.13 402.40,439.31 412.82,438.15 423.24,438.20 433.66,438.82 444.08,435.91 454.51,426.03 464.93,411.93 475.35,400.48 485.77,395.48 496.19,395.96 506.61,400.32 517.03,407.24 527.46,413.48 537.88,416.06 548.30,415.45 558.72,413.96 569.14,413.10 579.56,413.76 589.98,417.06 600.41,422.47 610.83,425.01 621.25,419.78 631.67,407.63 642.09,393.33 652.51,380.07 662.93,368.02 673.36,357.00 683.78,348.98 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,198.74 79.33,178.82 89.75,170.80 100.18,180.29 110.60,193.50 121.02,201.78 131.44,204.65 141.86,202.28 152.28,196.19 162.70,193.77 173.13,202.36 183.55,219.26 193.97,233.49 204.39,238.09 214.81,239.61 225.23,249.59 235.66,272.54 246.08,305.78 256.50,346.28 266.92,389.25 277.34,422.72 287.76,438.15 298.18,439.79 308.61,436.67 319.03,433.13 329.45,429.56 339.87,426.30 350.29,424.31 360.71,426.49 371.13,434.99 381.56,446.58 391.98,454.48 402.40,455.42 412.82,451.54 423.24,445.69 433.66,439.02 444.08,432.63 454.51,427.49 464.93,424.27 475.35,424.10 485.77,427.27 496.19,430.18 506.61,427.95 517.03,420.46 527.46,414.48 537.88,416.19 548.30,423.75 558.72,430.29 569.14,431.58 579.56,427.65 589.98,418.95 600.41,406.00 610.83,390.50 621.25,374.14 631.67,357.13 642.09,339.15 652.51,320.23 662.93,304.07 673.36,296.61 683.78,297.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,181.55 79.33,192.27 89.75,195.37 100.18,189.40 110.60,186.49 121.02,193.68 131.44,204.94 141.86,210.58 152.28,209.25 162.70,213.06 173.13,234.09 183.55,268.54 193.97,300.09 204.39,317.97 214.81,326.65 225.23,334.86 235.66,345.93 246.08,357.62 256.50,367.40 266.92,374.74 277.34,379.75 287.76,382.48 298.18,381.99 308.61,376.60 319.03,366.20 329.45,355.49 339.87,349.97 350.29,351.63 360.71,362.18 371.13,382.82 381.56,409.98 391.98,436.53 402.40,458.24 412.82,471.02 423.24,469.93 433.66,456.49 444.08,441.98 454.51,435.99 464.93,436.27 475.35,435.01 485.77,428.15 496.19,418.98 506.61,412.28 517.03,409.67 527.46,411.07 537.88,416.36 548.30,423.68 558.72,428.72 569.14,428.87 579.56,424.89 589.98,418.19 600.41,409.40 610.83,399.04 621.25,387.63 631.67,376.40 642.09,368.20 652.51,364.69 662.93,361.93 673.36,353.40 683.78,341.76 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,286.05 79.33,260.12 89.75,230.90 100.18,208.04 110.60,193.82 121.02,189.10 131.44,187.27 141.86,178.39 152.28,160.64 162.70,144.12 173.13,139.02 183.55,149.51 193.97,181.10 204.39,236.53 214.81,301.35 225.23,351.81 235.66,379.63 246.08,395.72 256.50,412.07 266.92,428.41 277.34,435.76 287.76,427.94 298.18,412.33 308.61,403.05 319.03,405.65 329.45,412.41 339.87,414.15 350.29,410.60 360.71,409.01 371.13,414.98 381.56,424.63 391.98,429.19 402.40,424.87 412.82,417.64 423.24,415.25 433.66,418.86 444.08,423.99 454.51,426.82 464.93,427.71 475.35,428.57 485.77,430.42 496.19,432.29 506.61,432.79 517.03,431.38 527.46,427.73 537.88,421.59 548.30,414.41 558.72,409.70 569.14,409.29 579.56,409.21 589.98,403.44 600.41,391.02 610.83,378.68 621.25,373.18 631.67,374.99 642.09,381.92 652.51,392.34 662.93,404.25 673.36,414.64 683.78,421.08 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,146.21 79.33,147.64 89.75,150.03 100.18,152.34 110.60,152.63 121.02,149.97 131.44,147.88 141.86,151.66 152.28,162.55 162.70,176.52 173.13,189.54 183.55,204.57 193.97,231.52 204.39,276.26 214.81,326.25 225.23,360.44 235.66,371.80 246.08,371.84 256.50,373.21 266.92,379.40 277.34,391.98 287.76,411.79 298.18,432.67 308.61,443.64 319.03,440.37 329.45,428.75 339.87,415.84 350.29,404.63 360.71,398.90 371.13,401.45 381.56,408.62 391.98,412.65 402.40,410.35 412.82,408.51 423.24,415.87 433.66,432.43 444.08,448.37 454.51,455.31 464.93,455.41 475.35,455.82 485.77,460.43 496.19,467.59 506.61,474.77 517.03,479.81 527.46,477.19 537.88,461.88 548.30,437.65 558.72,415.31 569.14,401.26 579.56,392.20 589.98,382.64 600.41,371.04 610.83,360.31 621.25,353.38 631.67,350.59 642.09,351.33 652.51,355.10 662.93,360.93 673.36,367.30 683.78,372.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,192.47 79.33,182.82 89.75,188.67 100.18,210.96 110.60,231.18 121.02,238.03 131.44,234.24 141.86,225.02 152.28,214.14 162.70,210.40 173.13,222.50 183.55,247.02 193.97,270.36 204.39,283.74 214.81,293.43 225.23,310.77 235.66,338.20 246.08,361.59 256.50,365.64 266.92,352.98 277.34,341.72 287.76,344.95 298.18,358.66 308.61,373.45 319.03,385.39 329.45,398.13 339.87,416.07 350.29,438.13 360.71,456.89 371.13,466.43 381.56,466.48 391.98,457.84 402.40,441.79 412.82,425.09 423.24,416.24 433.66,416.42 444.08,420.41 454.51,423.73 464.93,425.04 475.35,422.93 485.77,416.80 496.19,408.69 506.61,401.43 517.03,396.18 527.46,393.89 537.88,395.37 548.30,399.34 558.72,402.44 569.14,402.96 579.56,405.15 589.98,415.48 600.41,434.46 610.83,452.28 621.25,459.19 631.67,456.05 642.09,450.08 652.51,446.09 662.93,443.11 673.36,438.91 683.78,434.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,264.83 79.33,257.77 89.75,236.76 100.18,207.29 110.60,186.91 121.02,186.02 131.44,198.66 141.86,214.86 152.28,230.01 162.70,240.33 173.13,242.18 183.55,239.90 193.97,246.87 204.39,271.39 214.81,302.90 225.23,323.15 235.66,326.73 246.08,327.66 256.50,341.21 266.92,366.63 277.34,391.25 287.76,405.89 298.18,412.21 308.61,414.78 319.03,415.70 329.45,414.54 339.87,410.73 350.29,406.31 360.71,408.54 371.13,422.92 381.56,443.70 391.98,458.48 402.40,461.25 412.82,455.45 423.24,445.73 433.66,434.89 444.08,428.12 454.51,429.73 464.93,435.80 475.35,436.69 485.77,427.57 496.19,414.52 506.61,406.23 517.03,405.22 527.46,409.73 537.88,418.03 548.30,428.17 558.72,436.29 569.14,439.86 579.56,437.50 589.98,427.37 600.41,409.17 610.83,384.83 621.25,356.32 631.67,326.95 642.09,304.33 652.51,293.48 662.93,293.08 673.36,300.30 683.78,309.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,471.30 79.33,434.68 89.75,364.72 100.18,280.50 110.60,220.38 121.02,206.59 131.44,219.38 141.86,227.09 152.28,219.16 162.70,203.79 173.13,189.49 183.55,181.36 193.97,188.40 204.39,216.09 214.81,255.69 225.23,292.35 235.66,320.20 246.08,341.99 256.50,360.89 266.92,378.44 277.34,396.98 287.76,417.97 298.18,436.49 308.61,443.60 319.03,436.53 329.45,425.29 339.87,421.64 350.29,428.17 360.71,443.01 371.13,464.31 381.56,483.72 391.98,485.58 402.40,463.44 412.82,431.01 423.24,405.89 433.66,392.00 444.08,383.98 454.51,377.26 464.93,372.84 475.35,374.24 485.77,383.06 496.19,395.27 506.61,405.23 517.03,410.89 527.46,411.60 537.88,406.81 548.30,398.44 558.72,391.19 569.14,387.86 579.56,387.02 589.98,386.31 600.41,384.33 610.83,378.69 621.25,367.06 631.67,351.74 642.09,339.92 652.51,336.20 662.93,337.27 673.36,337.15 683.78,334.90 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,78.03 79.33,101.59 89.75,121.80 100.18,133.38 110.60,147.43 121.02,170.23 131.44,194.06 141.86,206.75 152.28,206.81 162.70,210.20 173.13,232.90 183.55,269.38 193.97,296.78 204.39,300.46 214.81,293.02 225.23,296.78 235.66,319.05 246.08,346.61 256.50,364.99 266.92,373.85 277.34,382.07 287.76,396.04 298.18,413.70 308.61,430.22 319.03,442.69 329.45,446.70 339.87,437.22 350.29,416.92 360.71,399.03 371.13,394.01 381.56,400.59 391.98,413.90 402.40,430.78 412.82,446.39 423.24,454.76 433.66,454.45 444.08,446.75 454.51,432.93 464.93,416.87 475.35,406.40 485.77,405.59 496.19,410.72 506.61,416.40 517.03,420.45 527.46,421.29 537.88,417.51 548.30,410.72 558.72,405.22 569.14,403.61 579.56,405.01 589.98,407.90 600.41,411.15 610.83,412.09 621.25,408.11 631.67,400.97 642.09,396.65 652.51,398.90 662.93,404.04 673.36,405.71 683.78,403.40 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,257.87 79.33,242.26 89.75,219.86 100.18,195.23 110.60,170.51 121.02,147.59 131.44,133.18 141.86,137.09 152.28,160.61 162.70,191.21 173.13,216.26 183.55,234.37 193.97,248.46 204.39,260.65 214.81,272.73 225.23,287.31 235.66,305.12 246.08,323.95 256.50,341.40 266.92,357.96 277.34,376.69 287.76,399.66 298.18,423.19 308.61,440.42 319.03,448.47 329.45,449.66 339.87,446.82 350.29,440.93 360.71,432.69 371.13,422.77 381.56,413.65 391.98,409.95 402.40,413.74 412.82,422.24 423.24,431.85 433.66,440.65 444.08,445.52 454.51,443.83 464.93,436.27 475.35,425.15 485.77,412.18 496.19,401.25 506.61,397.57 517.03,401.52 527.46,407.11 537.88,408.82 548.30,406.65 558.72,402.83 569.14,398.74 579.56,394.38 589.98,389.63 600.41,385.07 610.83,383.82 621.25,388.97 631.67,399.21 642.09,409.61 652.51,416.92 662.93,422.43 673.36,428.63 683.78,434.47 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,169.19 79.33,176.30 89.75,181.69 100.18,183.98 110.60,187.58 121.02,194.96 131.44,202.83 141.86,206.00 152.28,202.87 162.70,195.35 173.13,185.47 183.55,178.14 193.97,185.16 204.39,214.01 214.81,257.27 225.23,301.90 235.66,341.43 246.08,370.53 256.50,383.62 266.92,383.78 277.34,383.82 287.76,392.99 298.18,408.72 308.61,424.80 319.03,438.05 329.45,446.75 339.87,449.03 350.29,445.27 360.71,438.44 371.13,431.03 381.56,426.34 391.98,430.17 402.40,444.16 412.82,457.19 423.24,455.15 433.66,437.37 444.08,417.27 454.51,406.35 464.93,404.30 475.35,406.92 485.77,411.71 496.19,417.49 506.61,422.90 517.03,426.94 527.46,427.43 537.88,422.43 548.30,414.15 558.72,408.58 569.14,409.22 579.56,413.85 589.98,418.82 600.41,422.16 610.83,420.91 621.25,412.20 631.67,397.55 642.09,382.41 652.51,370.51 662.93,362.66 673.36,359.68 683.78,360.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,180.61 79.33,175.18 89.75,172.07 100.18,175.08 110.60,186.53 121.02,207.23 131.44,229.50 141.86,241.80 152.28,241.32 162.70,236.18 173.13,234.60 183.55,238.79 193.97,250.23 204.39,269.65 214.81,292.92 225.23,313.27 235.66,328.72 246.08,344.59 256.50,366.68 266.92,393.57 277.34,417.14 287.76,431.44 298.18,436.07 308.61,431.41 319.03,418.57 329.45,403.81 339.87,394.42 350.29,391.65 360.71,393.15 371.13,397.05 381.56,403.25 391.98,412.00 402.40,422.74 412.82,430.01 423.24,426.97 433.66,414.68 444.08,404.92 454.51,407.67 464.93,419.82 475.35,431.68 485.77,438.08 496.19,442.47 506.61,449.91 517.03,460.72 527.46,468.92 537.88,468.99 548.30,462.16 558.72,453.50 569.14,446.04 579.56,438.39 589.98,428.20 600.41,415.48 610.83,404.78 621.25,400.60 631.67,401.48 642.09,401.31 652.51,396.17 662.93,388.70 673.36,383.71 683.78,382.46 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,191.91 79.33,200.51 89.75,205.42 100.18,202.73 110.60,193.74 121.02,179.97 131.44,170.06 141.86,176.70 152.28,201.58 162.70,228.68 173.13,241.92 183.55,243.96 193.97,250.25 204.39,270.80 214.81,299.12 225.23,323.34 235.66,339.59 246.08,354.89 256.50,376.91 266.92,403.78 277.34,424.79 287.76,432.22 298.18,429.07 308.61,421.98 319.03,414.32 329.45,407.46 339.87,402.92 350.29,402.14 360.71,408.65 371.13,425.01 381.56,446.49 391.98,463.39 402.40,470.84 412.82,470.39 423.24,464.24 433.66,453.87 444.08,442.33 454.51,432.21 464.93,422.80 475.35,411.79 485.77,398.37 496.19,387.38 506.61,385.48 517.03,393.64 527.46,406.24 537.88,418.04 548.30,426.69 558.72,428.77 569.14,422.50 579.56,411.77 589.98,402.49 600.41,396.56 610.83,392.27 621.25,387.90 631.67,384.55 642.09,385.97 652.51,394.44 662.93,406.51 673.36,416.29 683.78,421.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,111.37 79.33,114.49 89.75,128.29 100.18,151.49 110.60,175.48 121.02,195.03 131.44,211.67 141.86,228.23 152.28,244.62 162.70,254.97 173.13,253.43 183.55,243.49 193.97,237.31 204.39,243.09 214.81,260.55 225.23,288.08 235.66,323.73 246.08,360.06 256.50,389.06 266.92,409.40 277.34,422.62 287.76,429.97 298.18,433.89 308.61,438.42 319.03,444.58 329.45,446.25 339.87,436.21 350.29,415.35 360.71,392.87 371.13,376.18 381.56,367.98 391.98,371.70 402.40,388.01 412.82,407.98 423.24,420.27 433.66,423.84 444.08,427.53 454.51,438.85 464.93,455.00 475.35,467.77 485.77,472.57 496.19,470.13 506.61,461.78 517.03,449.38 527.46,438.98 537.88,436.09 548.30,437.50 558.72,433.51 569.14,418.61 579.56,398.52 589.98,382.22 600.41,372.74 610.83,368.09 621.25,366.24 631.67,366.21 642.09,366.50 652.51,366.15 662.93,365.71 673.36,366.18 683.78,367.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,128.44 79.33,143.87 89.75,160.48 100.18,173.33 110.60,183.58 121.02,191.93 131.44,197.77 141.86,200.15 152.28,198.80 162.70,194.25 173.13,187.08 183.55,182.07 193.97,191.45 204.39,222.94 214.81,268.43 225.23,313.78 235.66,352.34 246.08,380.61 256.50,394.99 266.92,396.85 277.34,392.60 287.76,387.05 298.18,381.88 308.61,379.20 319.03,380.09 329.45,385.19 339.87,395.23 350.29,409.65 360.71,426.03 371.13,442.25 381.56,454.76 391.98,457.18 402.40,447.31 412.82,434.25 423.24,429.58 433.66,434.92 444.08,443.21 454.51,448.37 464.93,450.44 475.35,451.32 485.77,451.96 496.19,451.01 506.61,446.57 517.03,438.40 527.46,428.43 537.88,418.42 548.30,410.17 558.72,407.07 569.14,410.84 579.56,416.43 589.98,416.28 600.41,407.82 610.83,392.79 621.25,372.98 631.67,351.99 642.09,338.24 652.51,337.15 662.93,345.22 673.36,356.12 683.78,364.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,124.39 79.33,136.39 89.75,145.81 100.18,150.06 110.60,155.75 121.02,166.76 131.44,180.40 141.86,192.28 152.28,201.16 162.70,209.40 173.13,219.33 183.55,229.80 193.97,236.55 204.39,237.09 214.81,237.07 225.23,245.97 235.66,266.32 246.08,289.17 256.50,304.78 266.92,314.70 277.34,330.09 287.76,358.85 298.18,395.49 308.61,428.89 319.03,453.59 329.45,468.03 339.87,470.61 350.29,463.52 360.71,455.44 371.13,453.17 381.56,455.35 391.98,457.69 402.40,457.91 412.82,455.47 423.24,449.85 433.66,441.58 444.08,433.33 454.51,427.38 464.93,424.28 475.35,424.50 485.77,428.15 496.19,433.82 506.61,439.57 517.03,444.01 527.46,444.00 537.88,436.69 548.30,424.47 558.72,414.08 569.14,409.36 579.56,406.59 589.98,399.91 600.41,387.69 610.83,372.97 621.25,358.83 631.67,346.28 642.09,336.35 652.51,329.55 662.93,323.31 673.36,313.42 683.78,302.55 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,80.81 79.33,97.43 89.75,104.49 100.18,100.34 110.60,103.28 121.02,124.07 131.44,154.76 141.86,182.41 152.28,203.03 162.70,221.62 173.13,243.22 183.55,265.79 193.97,281.32 204.39,285.04 214.81,286.73 225.23,302.86 235.66,337.50 246.08,373.24 256.50,391.13 266.92,390.86 277.34,384.48 287.76,380.81 298.18,380.03 308.61,380.84 319.03,382.70 329.45,386.10 339.87,391.66 350.29,399.45 360.71,409.18 371.13,420.57 381.56,432.47 391.98,442.65 402.40,449.80 412.82,452.52 423.24,449.07 433.66,440.68 444.08,433.87 454.51,434.14 464.93,438.78 475.35,440.39 485.77,435.32 496.19,429.08 506.61,429.42 517.03,436.71 527.46,441.09 537.88,433.52 548.30,417.34 558.72,403.95 569.14,399.89 579.56,399.22 589.98,392.50 600.41,377.55 610.83,361.36 621.25,350.95 631.67,346.33 642.09,343.98 652.51,341.31 662.93,335.05 673.36,320.32 683.78,302.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,227.63 79.33,225.94 89.75,225.75 100.18,225.92 110.60,221.00 121.02,208.36 131.44,196.76 141.86,199.56 152.28,218.63 162.70,237.51 173.13,239.69 183.55,228.00 193.97,218.48 204.39,221.84 214.81,235.97 225.23,255.97 235.66,279.88 246.08,308.47 256.50,342.62 266.92,381.22 277.34,420.49 287.76,457.35 298.18,486.42 308.61,498.82 319.03,491.22 329.45,469.69 339.87,441.42 350.29,412.80 360.71,398.46 371.13,409.61 381.56,436.06 391.98,455.54 402.40,457.28 412.82,447.69 423.24,435.43 433.66,423.35 444.08,412.38 454.51,403.30 464.93,396.57 475.35,392.89 485.77,392.35 496.19,391.88 506.61,387.32 517.03,378.75 527.46,372.71 537.88,375.17 548.30,383.84 558.72,390.96 569.14,391.90 579.56,388.79 589.98,385.26 600.41,382.65 610.83,380.77 621.25,379.43 631.67,378.56 642.09,378.05 652.51,377.70 662.93,375.43 673.36,367.91 683.78,358.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,260.36 79.33,248.89 89.75,234.30 100.18,219.82 110.60,205.29 121.02,190.77 131.44,178.25 141.86,170.64 152.28,169.71 162.70,178.58 173.13,200.29 183.55,230.52 193.97,256.38 204.39,269.57 214.81,276.40 225.23,288.19 235.66,308.95 246.08,333.62 256.50,356.65 266.92,376.30 277.34,391.26 287.76,400.68 298.18,406.72 308.61,413.28 319.03,421.88 329.45,430.22 339.87,435.57 350.29,437.79 360.71,438.90 371.13,440.53 381.56,443.36 391.98,448.30 402.40,455.28 412.82,459.95 423.24,456.82 433.66,446.00 444.08,434.07 454.51,426.65 464.93,422.47 475.35,417.15 485.77,408.64 496.19,401.21 506.61,400.89 517.03,408.50 527.46,418.83 537.88,427.00 548.30,430.80 558.72,427.02 569.14,414.06 579.56,396.21 589.98,379.98 600.41,367.37 610.83,356.05 621.25,343.64 631.67,330.37 642.09,318.03 652.51,308.02 662.93,303.25 673.36,308.20 683.78,318.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,203.13 79.33,179.66 89.75,156.28 100.18,144.53 110.60,150.65 121.02,177.21 131.44,208.69 141.86,221.72 152.28,212.09 162.70,203.99 173.13,221.64 183.55,260.03 193.97,293.25 204.39,304.28 214.81,300.65 225.23,296.91 235.66,298.86 246.08,304.16 256.50,310.13 266.92,316.91 277.34,326.82 287.76,341.48 298.18,359.80 308.61,379.61 319.03,399.81 329.45,420.17 339.87,440.42 350.29,458.47 360.71,467.74 371.13,463.28 381.56,452.25 391.98,449.62 402.40,461.73 412.82,476.89 423.24,480.09 433.66,468.80 444.08,450.78 454.51,432.72 464.93,416.84 475.35,405.74 485.77,401.01 496.19,403.60 506.61,414.71 517.03,433.17 527.46,452.33 537.88,465.96 548.30,470.94 558.72,462.48 569.14,438.43 579.56,408.55 589.98,387.43 600.41,379.23 610.83,376.76 621.25,372.81 631.67,365.72 642.09,354.92 652.51,340.29 662.93,325.70 673.36,317.39 683.78,316.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,402.70 79.33,397.09 89.75,369.05 100.18,320.21 110.60,266.99 121.02,219.80 131.44,180.95 141.86,152.79 152.28,136.86 162.70,136.41 173.13,154.60 183.55,187.93 193.97,225.51 204.39,259.93 214.81,290.32 225.23,316.36 235.66,338.27 246.08,358.24 256.50,378.63 266.92,397.64 277.34,408.41 287.76,406.23 298.18,397.06 308.61,392.28 319.03,396.63 329.45,405.84 339.87,414.75 350.29,422.79 360.71,432.59 371.13,446.08 381.56,459.01 391.98,462.74 402.40,453.56 412.82,437.60 423.24,422.82 433.66,411.12 444.08,400.67 454.51,389.94 464.93,382.12 475.35,384.38 485.77,399.79 496.19,418.56 506.61,427.12 517.03,423.01 527.46,415.51 537.88,413.18 548.30,414.75 558.72,413.79 569.14,406.66 579.56,397.13 589.98,391.14 600.41,390.13 610.83,389.92 621.25,386.36 631.67,380.94 642.09,379.69 652.51,386.32 662.93,396.43 673.36,402.40 683.78,402.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,46.53 79.33,73.93 89.75,107.25 100.18,138.47 110.60,168.51 121.02,197.89 131.44,225.85 141.86,251.23 152.28,272.80 162.70,286.69 173.13,289.06 183.55,282.08 193.97,273.47 204.39,268.42 214.81,266.54 225.23,266.47 235.66,268.26 246.08,275.56 256.50,292.32 266.92,317.08 277.34,342.85 287.76,364.58 298.18,383.57 308.61,403.04 319.03,423.54 329.45,438.42 339.87,439.89 350.29,428.88 360.71,415.37 371.13,407.23 381.56,404.71 391.98,406.36 402.40,411.40 412.82,419.79 423.24,431.47 433.66,444.66 444.08,452.75 454.51,450.19 464.93,440.63 475.35,433.43 485.77,433.61 496.19,438.18 506.61,442.64 517.03,445.55 527.46,447.26 537.88,448.05 548.30,446.59 558.72,439.70 569.14,425.81 579.56,410.10 589.98,400.36 600.41,398.36 610.83,398.24 621.25,394.10 631.67,385.96 642.09,376.91 652.51,369.05 662.93,362.66 673.36,357.89 683.78,355.18 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,142.00 79.33,148.33 89.75,165.14 100.18,189.80 110.60,213.62 121.02,230.98 131.44,239.47 141.86,236.14 152.28,221.76 162.70,206.01 173.13,198.64 183.55,202.41 193.97,219.38 204.39,250.37 214.81,286.82 225.23,314.79 235.66,329.56 246.08,338.39 256.50,349.30 266.92,363.89 277.34,381.41 287.76,401.21 298.18,420.83 308.61,436.13 319.03,444.93 329.45,446.00 339.87,437.98 350.29,423.75 360.71,414.10 371.13,417.43 381.56,430.38 391.98,444.52 402.40,455.38 412.82,462.44 423.24,465.26 433.66,464.49 444.08,463.11 454.51,463.66 464.93,465.18 475.35,464.90 485.77,461.42 496.19,456.50 506.61,452.60 517.03,449.99 527.46,446.02 537.88,438.28 548.30,427.26 558.72,415.05 569.14,402.91 579.56,390.24 589.98,376.06 600.41,360.16 610.83,343.37 621.25,326.56 631.67,311.52 642.09,302.43 652.51,301.92 662.93,307.26 673.36,313.71 683.78,318.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,308.28 79.33,305.70 89.75,294.31 100.18,274.69 110.60,252.78 121.02,232.41 131.44,214.96 141.86,202.09 152.28,194.71 162.70,194.03 173.13,201.25 183.55,214.11 193.97,226.11 204.39,233.17 214.81,240.15 225.23,255.49 235.66,281.64 246.08,311.89 256.50,338.89 266.92,361.12 277.34,379.13 287.76,393.40 298.18,405.55 308.61,418.36 319.03,432.33 329.45,442.04 339.87,441.10 350.29,430.39 360.71,418.34 371.13,411.71 381.56,412.21 391.98,421.49 402.40,439.62 412.82,459.92 423.24,474.03 433.66,479.20 444.08,474.76 454.51,460.31 464.93,442.29 475.35,434.40 485.77,443.59 496.19,461.80 506.61,477.52 517.03,486.11 527.46,484.42 537.88,469.64 548.30,444.18 558.72,414.78 569.14,385.75 579.56,358.57 589.98,334.98 600.41,315.65 610.83,300.44 621.25,289.21 631.67,281.12 642.09,274.06 652.51,266.63 662.93,259.45 673.36,253.68 683.78,250.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,263.01 79.33,236.73 89.75,208.65 100.18,190.44 110.60,187.53 121.02,202.54 131.44,225.90 141.86,243.14 152.28,249.25 162.70,247.05 173.13,239.54 183.55,231.13 193.97,231.81 204.39,248.03 214.81,274.82 225.23,303.29 235.66,330.13 246.08,358.31 256.50,391.06 266.92,423.54 277.34,439.29 287.76,426.91 298.18,398.38 308.61,376.90 319.03,372.34 329.45,377.29 339.87,382.78 350.29,388.45 360.71,401.05 371.13,425.67 381.56,455.37 391.98,475.64 402.40,479.56 412.82,472.30 423.24,460.76 433.66,447.65 444.08,435.43 454.51,426.18 464.93,419.67 475.35,414.84 485.77,411.11 496.19,408.76 506.61,408.23 517.03,408.93 527.46,407.68 537.88,401.55 548.30,391.21 558.72,379.37 569.14,367.86 579.56,358.11 589.98,352.06 600.41,350.23 610.83,351.41 621.25,354.42 631.67,359.01 642.09,365.20 652.51,372.88 662.93,380.27 673.36,384.52 683.78,385.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,137.54 79.33,143.94 89.75,161.12 100.18,187.72 110.60,217.80 121.02,246.98 131.44,266.91 141.86,265.65 152.28,242.38 162.70,216.17 173.13,206.18 183.55,213.11 193.97,228.71 204.39,247.20 214.81,265.37 225.23,278.85 235.66,287.10 246.08,298.02 256.50,320.14 266.92,351.89 277.34,382.75 287.76,404.94 298.18,416.29 308.61,414.47 319.03,400.36 329.45,387.64 339.87,392.26 350.29,413.54 360.71,435.14 371.13,444.24 381.56,443.65 391.98,441.86 402.40,443.22 412.82,447.29 423.24,453.29 433.66,460.12 444.08,464.58 454.51,463.93 464.93,458.16 475.35,448.07 485.77,434.51 496.19,420.94 506.61,412.07 517.03,409.37 527.46,412.26 537.88,420.11 548.30,428.91 558.72,429.55 569.14,416.98 579.56,398.32 589.98,384.54 600.41,378.51 610.83,373.66 621.25,363.37 631.67,348.01 642.09,331.95 652.51,318.25 662.93,308.82 673.36,306.35 683.78,309.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,178.44 79.33,178.83 89.75,195.10 100.18,223.54 110.60,243.27 121.02,241.89 131.44,226.45 141.86,208.73 152.28,195.12 162.70,194.80 173.13,216.81 183.55,255.59 193.97,291.78 204.39,312.60 214.81,322.63 225.23,331.05 235.66,341.00 246.08,347.95 256.50,346.97 266.92,341.12 277.34,342.82 287.76,360.75 298.18,387.69 308.61,409.34 319.03,419.69 329.45,423.88 339.87,428.11 350.29,432.96 360.71,434.79 371.13,430.85 381.56,423.16 391.98,416.30 402.40,412.93 412.82,415.50 423.24,426.97 433.66,445.08 444.08,457.98 454.51,455.73 464.93,443.23 475.35,434.02 485.77,435.20 496.19,441.22 506.61,443.99 517.03,440.88 527.46,432.45 537.88,419.26 548.30,404.08 558.72,393.07 569.14,389.90 579.56,392.48 589.98,397.38 600.41,401.85 610.83,398.73 621.25,380.99 631.67,353.92 642.09,334.91 652.51,335.10 662.93,346.95 673.36,356.81 683.78,359.96 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,320.36 79.33,287.29 89.75,251.00 100.18,219.07 110.60,182.42 121.02,136.59 131.44,95.71 141.86,81.27 152.28,99.23 162.70,137.94 173.13,185.55 183.55,236.11 193.97,280.29 204.39,312.10 214.81,335.95 225.23,359.86 235.66,385.12 246.08,399.38 256.50,389.25 266.92,359.84 277.34,335.24 287.76,332.79 298.18,347.18 308.61,365.92 319.03,382.60 329.45,393.96 339.87,396.40 350.29,392.11 360.71,391.40 371.13,402.28 381.56,420.12 391.98,434.11 402.40,439.35 412.82,441.60 423.24,448.42 433.66,460.75 444.08,473.54 454.51,482.43 464.93,485.23 475.35,478.70 485.77,461.75 496.19,441.63 506.61,428.32 517.03,423.94 527.46,423.00 537.88,420.36 548.30,414.49 558.72,403.86 569.14,387.93 579.56,371.52 589.98,361.75 600.41,360.02 610.83,359.64 621.25,353.95 631.67,344.65 642.09,339.59 652.51,343.74 662.93,352.86 673.36,359.49 683.78,361.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,196.41 79.33,159.93 89.75,133.25 100.18,127.01 110.60,126.06 121.02,121.64 131.44,121.64 141.86,138.70 152.28,175.03 162.70,217.26 173.13,251.92 183.55,277.35 193.97,296.31 204.39,310.83 214.81,323.04 225.23,336.16 235.66,351.28 246.08,366.85 256.50,381.13 266.92,394.22 277.34,407.56 287.76,421.96 298.18,432.58 308.61,430.79 319.03,414.03 329.45,392.69 339.87,379.02 350.29,375.45 360.71,379.29 371.13,388.24 381.56,399.13 391.98,406.34 402.40,407.42 412.82,405.85 423.24,406.20 433.66,409.53 444.08,414.66 454.51,420.59 464.93,427.31 475.35,435.13 485.77,443.94 496.19,451.26 506.61,453.66 517.03,450.66 527.46,445.12 537.88,439.68 548.30,434.89 558.72,430.92 569.14,427.86 579.56,425.46 589.98,423.33 600.41,420.77 610.83,414.94 621.25,403.06 631.67,385.45 642.09,364.43 652.51,341.79 662.93,320.78 673.36,306.42 683.78,300.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,88.98 79.33,98.23 89.75,126.50 100.18,169.30 110.60,209.43 121.02,236.08 131.44,247.89 141.86,243.94 152.28,226.64 162.70,209.89 173.13,207.57 183.55,218.16 193.97,230.36 204.39,236.97 214.81,244.27 225.23,263.45 235.66,297.00 246.08,331.56 256.50,352.62 266.92,361.95 277.34,374.67 287.76,401.36 298.18,433.29 308.61,453.11 319.03,454.13 329.45,446.52 339.87,442.41 350.29,443.53 360.71,444.88 371.13,442.54 381.56,437.95 391.98,434.79 402.40,434.48 412.82,433.15 423.24,425.84 433.66,414.60 444.08,412.83 454.51,431.69 464.93,461.72 475.35,479.41 485.77,472.72 496.19,454.20 506.61,441.88 517.03,440.23 527.46,441.98 537.88,440.39 548.30,436.06 558.72,433.06 569.14,433.58 579.56,433.51 589.98,426.61 600.41,411.42 610.83,392.48 621.25,374.39 631.67,358.90 642.09,348.13 652.51,343.42 662.93,342.96 673.36,343.74 683.78,344.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,172.86 79.33,185.12 89.75,213.64 100.18,249.29 110.60,268.74 121.02,258.55 131.44,231.90 141.86,209.78 152.28,200.10 162.70,202.01 173.13,214.47 183.55,233.61 193.97,249.86 204.39,257.05 214.81,260.41 225.23,269.19 235.66,286.66 246.08,308.75 256.50,330.97 266.92,350.55 277.34,362.45 287.76,363.44 298.18,362.88 308.61,377.77 319.03,413.92 329.45,456.01 339.87,485.91 350.29,500.14 360.71,503.09 371.13,498.35 381.56,488.06 391.98,475.45 402.40,462.34 412.82,449.52 423.24,437.92 433.66,428.15 444.08,421.47 454.51,418.93 464.93,419.58 475.35,421.17 485.77,422.46 496.19,424.06 506.61,426.89 517.03,430.70 527.46,433.01 537.88,431.54 548.30,426.46 558.72,419.04 569.14,409.96 579.56,398.20 589.98,382.14 600.41,362.04 610.83,342.25 621.25,327.11 631.67,316.52 642.09,307.97 652.51,299.84 662.93,292.90 673.36,288.58 683.78,287.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,268.42 79.33,293.35 89.75,301.67 100.18,285.23 110.60,260.02 121.02,236.13 131.44,215.14 141.86,198.34 152.28,186.73 162.70,182.95 173.13,189.57 183.55,203.81 193.97,217.09 204.39,224.06 214.81,231.55 225.23,251.35 235.66,286.79 246.08,327.73 256.50,363.14 266.92,390.70 277.34,411.16 287.76,425.02 298.18,431.43 308.61,428.76 319.03,417.46 329.45,405.76 339.87,403.28 350.29,410.69 360.71,421.86 371.13,431.88 381.56,440.02 391.98,446.04 402.40,449.84 412.82,451.57 423.24,451.41 433.66,449.97 444.08,449.28 454.51,451.02 464.93,453.37 475.35,451.93 485.77,444.60 496.19,435.41 506.61,429.97 517.03,429.26 527.46,429.15 537.88,425.87 548.30,419.99 558.72,414.43 569.14,410.84 579.56,407.97 589.98,403.74 600.41,396.94 610.83,385.48 621.25,367.31 631.67,344.32 642.09,322.48 652.51,305.87 662.93,295.33 673.36,291.67 683.78,293.04 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,344.41 79.33,330.54 89.75,295.53 100.18,247.67 110.60,210.66 121.02,198.28 131.44,199.01 141.86,194.24 152.28,180.18 162.70,173.81 173.13,192.12 183.55,228.98 193.97,259.35 204.39,267.02 214.81,262.72 225.23,266.00 235.66,284.03 246.08,309.70 256.50,335.16 266.92,358.41 277.34,378.98 287.76,396.39 298.18,408.56 308.61,411.93 319.03,405.57 329.45,394.71 339.87,385.47 350.29,381.80 360.71,391.26 371.13,419.41 381.56,455.55 391.98,477.71 402.40,475.98 412.82,462.38 423.24,452.59 433.66,450.15 444.08,450.57 454.51,449.95 464.93,447.66 475.35,443.55 485.77,437.68 496.19,431.37 506.61,426.44 517.03,423.52 527.46,422.70 537.88,424.06 548.30,426.96 558.72,429.90 569.14,431.59 579.56,427.79 589.98,412.41 600.41,384.58 610.83,351.62 621.25,320.88 631.67,295.81 642.09,281.55 652.51,281.22 662.93,289.92 673.36,299.38 683.78,305.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,186.67 79.33,177.98 89.75,175.43 100.18,182.10 110.60,192.62 121.02,203.42 131.44,211.32 141.86,211.96 152.28,205.85 162.70,203.95 173.13,217.21 183.55,241.95 193.97,262.80 204.39,269.85 214.81,270.44 225.23,277.81 235.66,296.37 246.08,318.69 256.50,336.65 266.92,350.46 277.34,366.30 287.76,388.46 298.18,412.81 308.61,431.33 319.03,440.39 329.45,441.23 339.87,435.43 350.29,425.69 360.71,419.51 371.13,422.72 381.56,432.28 391.98,440.95 402.40,445.08 412.82,445.57 423.24,443.73 433.66,440.41 444.08,437.24 454.51,435.62 464.93,435.60 475.35,436.83 485.77,438.81 496.19,438.55 506.61,432.02 517.03,419.53 527.46,408.45 537.88,405.50 548.30,408.14 558.72,407.76 569.14,399.36 579.56,386.81 589.98,376.33 600.41,369.73 610.83,364.20 621.25,356.89 631.67,348.02 642.09,339.58 652.51,332.96 662.93,328.78 673.36,327.87 683.78,329.27 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,264.82 79.33,272.75 89.75,268.88 100.18,251.75 110.60,234.27 121.02,224.25 131.44,218.98 141.86,213.61 152.28,207.12 162.70,203.71 173.13,207.61 183.55,217.11 193.97,225.48 204.39,228.58 214.81,232.14 225.23,245.98 235.66,272.67 246.08,302.57 256.50,325.17 266.92,339.48 277.34,349.70 287.76,358.95 298.18,367.77 308.61,376.58 319.03,385.59 329.45,395.15 339.87,405.63 350.29,416.86 360.71,427.92 371.13,438.16 381.56,448.47 391.98,460.82 402.40,475.84 412.82,490.63 423.24,501.48 433.66,507.02 444.08,506.37 454.51,498.80 464.93,486.24 475.35,472.91 485.77,461.04 496.19,448.80 506.61,433.55 517.03,415.87 527.46,402.13 537.88,398.17 548.30,401.15 558.72,402.09 569.14,395.79 579.56,386.31 589.98,380.17 600.41,379.41 610.83,381.95 621.25,385.60 631.67,388.67 642.09,387.82 652.51,381.01 662.93,370.83 673.36,361.74 683.78,356.40 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,64.88 79.33,89.15 89.75,131.84 100.18,180.51 110.60,213.00 121.02,216.63 131.44,204.77 141.86,198.61 152.28,205.15 162.70,218.63 173.13,233.16 183.55,246.35 193.97,255.08 204.39,257.70 214.81,260.89 225.23,275.73 235.66,305.36 246.08,340.51 256.50,371.05 266.92,393.29 277.34,403.28 287.76,398.51 298.18,385.73 308.61,377.29 319.03,378.30 329.45,383.77 339.87,387.67 350.29,390.99 360.71,402.17 371.13,427.61 381.56,459.40 391.98,480.83 402.40,484.28 412.82,478.49 423.24,474.88 433.66,475.93 444.08,478.00 454.51,477.97 464.93,476.03 475.35,473.48 485.77,470.92 496.19,466.50 506.61,457.71 517.03,444.79 527.46,432.47 537.88,425.11 548.30,421.41 558.72,416.60 569.14,407.81 579.56,395.86 589.98,382.29 600.41,367.48 610.83,350.52 621.25,330.49 631.67,309.00 642.09,290.64 652.51,278.49 662.93,272.08 673.36,270.29 683.78,271.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,339.02 79.33,321.16 89.75,283.31 100.18,234.19 110.60,194.01 121.02,174.84 131.44,170.44 141.86,170.29 152.28,171.36 162.70,178.85 173.13,197.99 183.55,224.93 193.97,246.87 204.39,255.64 214.81,258.36 225.23,267.64 235.66,288.31 246.08,316.98 256.50,349.88 266.92,384.73 277.34,417.52 287.76,445.11 298.18,464.66 308.61,471.70 319.03,464.97 329.45,450.24 339.87,434.28 350.29,418.34 360.71,400.54 371.13,379.55 381.56,359.34 391.98,347.84 402.40,348.97 412.82,361.12 423.24,382.08 433.66,409.82 444.08,439.28 454.51,466.10 464.93,487.95 475.35,501.36 485.77,504.51 496.19,499.27 506.61,488.31 517.03,473.12 527.46,456.26 537.88,440.04 548.30,424.44 558.72,408.42 569.14,391.61 579.56,377.20 589.98,369.94 600.41,370.19 610.83,370.64 621.25,364.04 631.67,350.89 642.09,336.32 652.51,323.68 662.93,311.67 673.36,297.78 683.78,285.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,235.26 79.33,217.00 89.75,203.40 100.18,201.61 110.60,208.54 121.02,221.88 131.44,236.86 141.86,246.61 152.28,248.93 162.70,246.08 173.13,240.39 183.55,233.83 193.97,230.43 204.39,232.85 214.81,240.57 225.23,252.33 235.66,268.01 246.08,289.88 256.50,320.37 266.92,357.03 277.34,390.98 287.76,415.66 298.18,429.88 308.61,432.78 319.03,425.19 329.45,415.59 339.87,413.91 350.29,421.17 360.71,432.09 371.13,442.39 381.56,450.18 391.98,452.85 402.40,449.36 412.82,442.27 423.24,434.91 433.66,429.04 444.08,427.59 454.51,432.93 464.93,441.32 475.35,444.10 485.77,436.92 496.19,425.12 506.61,416.28 517.03,412.30 527.46,410.09 537.88,406.80 548.30,402.11 558.72,396.41 569.14,390.01 579.56,383.60 589.98,378.19 600.41,374.71 610.83,376.02 621.25,384.89 631.67,398.99 642.09,410.80 652.51,415.42 662.93,415.04 673.36,413.85 683.78,413.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,161.10 79.33,177.22 89.75,189.39 100.18,190.87 110.60,183.22 121.02,167.77 131.44,148.76 141.86,132.36 152.28,122.03 162.70,123.15 173.13,141.05 183.55,171.70 193.97,201.71 204.39,222.57 214.81,241.74 225.23,272.49 235.66,318.45 246.08,367.77 256.50,407.49 266.92,434.67 277.34,449.43 287.76,452.09 298.18,446.18 308.61,437.88 319.03,430.16 329.45,423.39 339.87,417.86 350.29,413.78 360.71,411.55 371.13,411.48 381.56,413.60 391.98,417.91 402.40,424.23 412.82,431.23 423.24,437.25 433.66,441.96 444.08,445.99 454.51,449.83 464.93,451.86 475.35,448.50 485.77,438.06 496.19,423.88 506.61,410.62 517.03,400.10 527.46,393.21 537.88,390.80 548.30,392.83 558.72,398.98 569.14,408.72 579.56,418.65 589.98,423.78 600.41,421.68 610.83,409.67 621.25,385.18 631.67,352.55 642.09,324.41 652.51,309.03 662.93,303.20 673.36,300.69 683.78,299.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,170.35 79.33,186.15 89.75,199.43 100.18,204.46 110.60,203.82 121.02,199.51 131.44,196.49 141.86,201.88 152.28,216.63 162.70,231.67 173.13,237.88 183.55,235.58 193.97,230.37 204.39,226.30 214.81,226.92 225.23,237.46 235.66,260.00 246.08,293.68 256.50,337.48 266.92,386.94 277.34,429.69 287.76,456.77 298.18,470.72 308.61,477.63 319.03,480.15 329.45,476.64 339.87,465.13 350.29,447.72 360.71,433.07 371.13,427.91 381.56,429.16 391.98,429.26 402.40,424.88 412.82,420.86 423.24,423.50 433.66,433.67 444.08,447.49 454.51,461.52 464.93,472.50 475.35,474.59 485.77,465.08 496.19,450.05 506.61,437.98 517.03,430.99 527.46,425.69 537.88,418.92 548.30,409.83 558.72,397.73 569.14,382.42 579.56,366.65 589.98,354.46 600.41,347.05 610.83,342.61 621.25,339.29 631.67,335.36 642.09,327.29 652.51,312.79 662.93,293.34 673.36,271.61 683.78,254.02 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,158.33 79.33,160.60 89.75,155.54 100.18,145.13 110.60,141.84 121.02,152.88 131.44,171.56 141.86,187.16 152.28,196.37 162.70,203.18 173.13,211.65 183.55,222.74 193.97,236.81 204.39,254.15 214.81,275.15 225.23,300.41 235.66,329.41 246.08,357.72 256.50,380.53 266.92,398.09 277.34,414.48 287.76,432.39 298.18,446.95 308.61,449.07 319.03,435.40 329.45,412.58 339.87,388.47 350.29,367.72 360.71,358.70 371.13,367.79 381.56,388.88 391.98,408.65 402.40,420.61 412.82,428.01 423.24,435.32 433.66,444.29 444.08,456.45 454.51,472.95 464.93,488.97 475.35,493.89 485.77,482.60 496.19,463.73 506.61,449.44 517.03,443.17 527.46,441.99 537.88,443.11 548.30,444.34 558.72,441.65 569.14,432.48 579.56,416.17 589.98,391.97 600.41,361.08 610.83,330.82 621.25,308.49 631.67,294.73 642.09,287.42 652.51,284.99 662.93,285.00 673.36,283.79 683.78,281.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,297.63 79.33,305.57 89.75,291.92 100.18,255.75 110.60,218.75 121.02,194.50 131.44,183.39 141.86,184.63 152.28,196.55 162.70,212.41 173.13,225.46 183.55,236.35 193.97,250.33 204.39,270.80 214.81,295.87 225.23,321.96 235.66,346.94 246.08,367.12 256.50,378.60 266.92,383.86 277.34,392.84 287.76,412.46 298.18,435.46 308.61,447.85 319.03,444.52 329.45,435.76 339.87,433.76 350.29,439.48 360.71,445.33 371.13,445.32 381.56,440.37 391.98,433.69 402.40,427.18 412.82,422.74 423.24,422.70 433.66,426.80 444.08,431.50 454.51,433.78 464.93,433.92 475.35,433.44 485.77,433.18 496.19,432.91 506.61,432.25 517.03,431.38 527.46,431.68 537.88,434.39 548.30,437.51 558.72,435.92 569.14,426.64 579.56,411.86 589.98,395.18 600.41,378.11 610.83,361.44 621.25,345.91 631.67,332.12 642.09,321.20 652.51,313.74 662.93,307.40 673.36,298.37 683.78,288.81 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,225.98 79.33,223.93 89.75,234.89 100.18,256.83 110.60,272.92 121.02,273.29 131.44,265.50 141.86,261.79 152.28,265.21 162.70,267.47 173.13,260.22 183.55,246.92 193.97,240.98 204.39,251.12 214.81,272.06 225.23,294.02 235.66,313.15 246.08,331.25 256.50,350.34 266.92,369.06 277.34,382.00 287.76,385.45 298.18,384.09 308.61,386.82 319.03,397.21 329.45,410.88 339.87,422.59 350.29,429.96 360.71,429.82 371.13,419.86 381.56,404.84 391.98,394.53 402.40,393.74 412.82,400.48 423.24,411.96 433.66,427.00 444.08,444.22 454.51,462.34 464.93,477.59 475.35,482.41 485.77,472.97 496.19,453.90 506.61,431.81 517.03,410.14 527.46,393.97 537.88,387.96 548.30,391.10 558.72,399.15 569.14,409.31 579.56,419.40 589.98,426.48 600.41,429.08 610.83,425.58 621.25,414.38 631.67,397.46 642.09,380.79 652.51,368.36 662.93,359.77 673.36,353.84 683.78,350.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,151.89 79.33,166.99 89.75,187.20 100.18,207.09 110.60,223.30 121.02,233.54 131.44,235.52 141.86,226.09 152.28,206.71 162.70,190.96 173.13,192.40 183.55,210.18 193.97,234.89 204.39,260.09 214.81,284.86 225.23,308.62 235.66,330.61 246.08,347.95 256.50,357.52 266.92,360.56 277.34,362.79 287.76,368.29 298.18,375.68 308.61,381.69 319.03,385.03 329.45,387.19 339.87,389.95 350.29,392.95 360.71,393.36 371.13,389.25 381.56,387.42 391.98,401.45 402.40,436.54 412.82,477.73 423.24,505.85 433.66,516.37 444.08,514.02 454.51,502.97 464.93,486.96 475.35,472.61 485.77,463.26 496.19,454.73 506.61,441.05 517.03,421.69 527.46,402.99 537.88,390.82 548.30,385.32 558.72,384.44 569.14,386.79 579.56,391.01 589.98,395.25 600.41,398.01 610.83,395.37 621.25,383.47 631.67,364.77 642.09,347.61 652.51,337.56 662.93,333.89 673.36,334.67 683.78,337.41 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,87.07 79.33,117.02 89.75,144.61 100.18,161.90 110.60,178.77 121.02,201.02 131.44,224.75 141.86,243.53 152.28,255.02 162.70,259.75 173.13,258.31 183.55,251.34 193.97,240.14 204.39,226.16 214.81,216.98 225.23,224.69 235.66,252.75 246.08,291.10 256.50,328.78 266.92,363.22 277.34,394.46 287.76,422.48 298.18,447.07 308.61,467.87 319.03,484.24 329.45,492.91 339.87,490.12 350.29,477.16 360.71,461.59 371.13,449.42 381.56,440.51 391.98,433.17 402.40,426.63 412.82,421.66 423.24,419.27 433.66,419.70 444.08,422.66 454.51,427.86 464.93,433.37 475.35,435.18 485.77,431.30 496.19,424.50 506.61,418.70 517.03,414.67 527.46,410.01 537.88,402.50 548.30,393.29 558.72,385.93 569.14,382.48 579.56,381.13 589.98,379.04 600.41,375.14 610.83,369.58 621.25,362.56 631.67,355.58 642.09,352.47 652.51,355.59 662.93,361.97 673.36,366.52 683.78,367.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,213.03 79.33,231.14 89.75,241.74 100.18,238.37 110.60,227.84 121.02,214.75 131.44,203.75 141.86,201.31 152.28,209.31 162.70,224.80 173.13,244.73 183.55,264.64 193.97,274.45 204.39,267.99 214.81,254.81 225.23,251.25 235.66,263.61 246.08,288.00 256.50,320.04 266.92,356.38 277.34,390.22 287.76,416.57 298.18,435.03 308.61,445.84 319.03,449.28 329.45,446.29 339.87,438.01 350.29,426.43 360.71,417.13 371.13,414.46 381.56,417.10 391.98,421.39 402.40,425.52 412.82,429.85 423.24,434.97 433.66,441.35 444.08,450.07 454.51,462.00 464.93,474.63 475.35,482.38 485.77,482.19 496.19,475.08 506.61,462.64 517.03,446.40 527.46,430.60 537.88,419.12 548.30,411.17 558.72,403.39 569.14,393.64 579.56,381.42 589.98,366.18 600.41,347.90 610.83,327.43 621.25,305.63 631.67,284.29 642.09,267.51 652.51,258.10 662.93,256.31 673.36,262.17 683.78,271.20 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,275.83 79.33,262.99 89.75,238.24 100.18,208.87 110.60,189.94 121.02,190.34 131.44,203.87 141.86,220.46 152.28,235.39 162.70,244.48 173.13,243.67 183.55,235.87 193.97,230.90 204.39,235.33 214.81,248.39 225.23,267.89 235.66,292.31 246.08,318.10 256.50,341.44 266.92,362.67 277.34,385.29 287.76,411.68 298.18,437.60 308.61,455.18 319.03,460.93 329.45,456.29 339.87,443.10 350.29,424.89 360.71,411.81 371.13,411.66 381.56,419.38 391.98,423.34 402.40,418.53 412.82,413.19 423.24,417.99 433.66,433.37 444.08,448.88 454.51,455.61 464.93,454.31 475.35,449.36 485.77,443.32 496.19,436.97 506.61,431.19 517.03,426.45 527.46,423.58 537.88,423.28 548.30,423.62 558.72,419.80 569.14,409.09 579.56,394.31 589.98,379.88 600.41,367.79 610.83,359.38 621.25,355.96 631.67,355.99 642.09,354.74 652.51,349.23 662.93,341.89 673.36,337.07 683.78,335.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='68.91,206.16 79.33,215.87 89.75,217.09 100.18,208.12 110.60,200.18 121.02,199.77 131.44,201.10 141.86,194.83 152.28,179.42 162.70,165.16 173.13,162.41 183.55,172.21 193.97,191.86 204.39,219.13 214.81,248.61 225.23,271.83 235.66,287.06 246.08,305.56 256.50,339.49 266.92,386.20 277.34,429.55 287.76,457.76 298.18,471.29 308.61,473.11 319.03,465.26 329.45,452.20 339.87,439.06 350.29,427.72 360.71,419.85 371.13,416.77 381.56,418.04 391.98,422.48 402.40,429.29 412.82,436.75 423.24,442.79 433.66,446.47 444.08,446.68 454.51,442.50 464.93,434.77 475.35,425.48 485.77,416.13 496.19,410.00 506.61,411.47 517.03,420.01 527.46,426.92 537.88,424.25 548.30,414.81 558.72,408.36 569.14,410.37 579.56,414.17 589.98,409.36 600.41,393.67 610.83,375.62 621.25,363.74 631.67,358.16 642.09,354.86 652.51,351.17 662.93,347.78 673.36,346.18 683.78,346.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<rect x='38.17' y='22.78' width='676.35' height='522.33' style='stroke-width: 1.07; stroke: #333333;' /> </g> <g clip-path='url(#cpMC4wMHw3MjAuMDB8MC4wMHw1NzYuMDA=)'> -<text x='38.13' y='506.78' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='20.06px' lengthAdjust='spacingAndGlyphs'>-0.02</text> -<text x='38.13' y='344.97' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='20.06px' lengthAdjust='spacingAndGlyphs'>-0.01</text> -<text x='38.13' y='183.15' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>0.00</text> -<polyline points='40.32,503.76 43.06,503.76 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='40.32,341.94 43.06,341.94 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='40.32,180.12 43.06,180.12 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='45.98,547.85 45.98,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='325.11,547.85 325.11,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='607.31,547.85 607.31,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<text x='45.98' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='13.70px' lengthAdjust='spacingAndGlyphs'>Apr</text> -<text x='325.11' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='11.25px' lengthAdjust='spacingAndGlyphs'>Jul</text> -<text x='607.31' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='13.70px' lengthAdjust='spacingAndGlyphs'>Oct</text> -<text x='378.79' y='568.24' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='75.23px' lengthAdjust='spacingAndGlyphs'>Reference date</text> +<text x='33.24' y='529.16' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='15.16px' lengthAdjust='spacingAndGlyphs'>-0.1</text> +<text x='33.24' y='388.35' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='12.23px' lengthAdjust='spacingAndGlyphs'>0.0</text> +<text x='33.24' y='247.54' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='12.23px' lengthAdjust='spacingAndGlyphs'>0.1</text> +<text x='33.24' y='106.73' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='12.23px' lengthAdjust='spacingAndGlyphs'>0.2</text> +<polyline points='35.43,526.14 38.17,526.14 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='35.43,385.32 38.17,385.32 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='35.43,244.51 38.17,244.51 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='35.43,103.70 38.17,103.70 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='121.02,547.85 121.02,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='266.92,547.85 266.92,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='412.82,547.85 412.82,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='589.98,547.85 589.98,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<text x='121.02' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.40px' lengthAdjust='spacingAndGlyphs'>Feb 15</text> +<text x='266.92' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 01</text> +<text x='412.82' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 15</text> +<text x='589.98' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='25.93px' lengthAdjust='spacingAndGlyphs'>Apr 01</text> +<text x='376.34' y='568.24' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='75.23px' lengthAdjust='spacingAndGlyphs'>Reference date</text> <text transform='translate(13.05,283.95) rotate(-90)' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='110.04px' lengthAdjust='spacingAndGlyphs'>Intrinsic growth rate (r)</text> -<text x='43.06' y='14.56' style='font-size: 13.20px; font-family: sans;' textLength='4.40px' lengthAdjust='spacingAndGlyphs'>r</text> +<text x='38.17' y='14.56' style='font-size: 13.20px; font-family: sans;' textLength='4.40px' lengthAdjust='spacingAndGlyphs'>r</text> </g> </svg> diff --git a/tests/testthat/_snaps/plot/rt.svg b/tests/testthat/_snaps/plot/rt.svg index 86b7c71..1486d00 100644 --- a/tests/testthat/_snaps/plot/rt.svg +++ b/tests/testthat/_snaps/plot/rt.svg @@ -27,138 +27,144 @@ </defs> <g clip-path='url(#cpNDAuMTN8NzE0LjUyfDIyLjc4fDU0NS4xMQ==)'> <rect x='40.13' y='22.78' width='674.39' height='522.33' style='stroke-width: 1.07; stroke: none; fill: #FFFFFF;' /> -<polyline points='40.13,483.07 714.52,483.07 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='40.13,361.37 714.52,361.37 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='40.13,246.08 714.52,246.08 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='40.13,136.57 714.52,136.57 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='40.13,32.28 714.52,32.28 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='183.24,545.11 183.24,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='465.13,545.11 465.13,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='40.13,420.53 714.52,420.53 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='40.13,302.21 714.52,302.21 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='40.13,189.96 714.52,189.96 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='40.13,83.18 714.52,83.18 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='43.06,545.11 43.06,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='323.41,545.11 323.41,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<polyline points='606.85,545.11 606.85,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> -<line x1='40.13' y1='189.96' x2='714.52' y2='189.96' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.50; stroke-linecap: butt;' /> -<polyline points='70.79,119.98 73.87,119.92 76.95,119.95 80.03,120.27 83.11,121.09 86.19,122.56 89.27,124.69 92.35,127.30 95.43,130.19 98.51,133.18 101.59,136.11 104.68,138.82 107.76,141.18 110.84,143.06 113.92,144.35 117.00,145.01 120.08,145.06 123.16,144.61 126.24,143.73 129.32,142.50 132.40,141.09 135.48,139.87 138.56,139.22 141.65,139.47 144.73,140.91 147.81,143.49 150.89,146.78 153.97,150.38 157.05,153.88 160.13,156.94 163.21,159.51 166.29,161.68 169.37,163.59 172.45,165.33 175.53,167.04 178.61,168.85 181.70,170.92 184.78,173.38 187.86,176.34 190.94,179.76 194.02,183.30 197.10,186.60 200.18,189.33 203.26,191.19 206.34,192.29 209.42,193.12 212.50,194.21 215.58,196.02 218.67,198.95 221.75,202.98 224.83,207.83 227.91,213.23 230.99,218.93 234.07,224.69 237.15,230.32 240.23,235.67 243.31,240.59 246.39,244.96 249.47,248.77 252.55,252.13 255.63,255.21 258.72,258.15 261.80,261.09 264.88,264.16 267.96,267.52 271.04,271.29 274.12,275.58 277.20,280.50 280.28,286.08 283.36,292.30 286.44,299.17 289.52,306.66 292.60,314.70 295.69,322.86 298.77,330.68 301.85,337.69 304.93,343.52 308.01,348.01 311.09,351.46 314.17,354.24 317.25,356.69 320.33,359.12 323.41,361.70 326.49,364.41 329.57,367.23 332.66,370.12 335.74,373.02 338.82,375.81 341.90,378.28 344.98,380.27 348.06,381.63 351.14,382.23 354.22,382.04 357.30,381.07 360.38,379.33 363.46,376.83 366.54,373.72 369.62,370.43 372.71,367.38 375.79,364.96 378.87,363.53 381.95,363.32 385.03,364.42 388.11,366.91 391.19,370.83 394.27,376.21 397.35,382.81 400.43,390.27 403.51,398.26 406.59,406.49 409.68,414.68 412.76,422.55 415.84,429.87 418.92,436.43 422.00,442.05 425.08,446.58 428.16,449.93 431.24,452.02 434.32,452.78 437.40,452.16 440.48,450.22 443.56,447.09 446.64,442.90 449.73,437.78 452.81,431.88 455.89,425.48 458.97,418.93 462.05,412.57 465.13,406.68 468.21,401.50 471.29,397.11 474.37,393.53 477.45,390.78 480.53,388.86 483.61,387.70 486.70,387.15 489.78,387.04 492.86,387.19 495.94,387.48 499.02,387.88 502.10,388.48 505.18,389.38 508.26,390.66 511.34,392.40 514.42,394.62 517.50,397.33 520.58,400.51 523.66,404.15 526.75,408.19 529.83,412.39 532.91,416.49 535.99,420.22 539.07,423.37 542.15,425.86 545.23,427.84 548.31,429.53 551.39,431.10 554.47,432.73 557.55,434.44 560.63,436.14 563.72,437.72 566.80,439.07 569.88,440.12 572.96,441.05 576.04,442.15 579.12,443.67 582.20,445.88 585.28,448.87 588.36,452.31 591.44,455.76 594.52,458.79 597.60,461.04 600.68,462.31 603.77,462.73 606.85,462.46 609.93,461.68 613.01,460.54 616.09,459.10 619.17,457.33 622.25,455.19 625.33,452.63 628.41,449.62 631.49,446.25 634.57,442.64 637.65,438.91 640.74,435.16 643.82,431.48 646.90,427.89 649.98,424.39 653.06,420.95 656.14,417.59 659.22,414.27 662.30,410.98 665.38,407.66 668.46,404.30 671.54,400.88 674.62,397.50 677.70,394.37 680.79,391.70 683.87,389.68 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,134.84 73.87,134.73 76.95,134.53 80.03,134.34 83.11,134.26 86.19,134.37 89.27,134.72 92.35,135.38 95.43,136.35 98.51,137.67 101.59,139.35 104.68,141.30 107.76,143.40 110.84,145.52 113.92,147.54 117.00,149.37 120.08,150.88 123.16,151.99 126.24,152.59 129.32,152.61 132.40,151.98 135.48,150.64 138.56,148.51 141.65,145.55 144.73,141.72 147.81,137.32 150.89,133.02 153.97,129.45 157.05,127.19 160.13,126.73 163.21,128.04 166.29,130.82 169.37,134.79 172.45,139.63 175.53,145.06 178.61,150.73 181.70,156.28 184.78,161.41 187.86,165.86 190.94,169.59 194.02,173.02 197.10,176.60 200.18,180.77 203.26,185.91 206.34,191.86 209.42,197.92 212.50,203.38 215.58,207.59 218.67,210.04 221.75,211.13 224.83,211.72 227.91,212.68 230.99,214.80 234.07,218.64 237.15,223.99 240.23,230.41 243.31,237.48 246.39,244.80 249.47,252.01 252.55,258.86 255.63,265.15 258.72,270.71 261.80,275.38 264.88,279.22 267.96,282.46 271.04,285.35 274.12,288.13 277.20,290.98 280.28,294.01 283.36,297.21 286.44,300.60 289.52,304.17 292.60,307.89 295.69,311.65 298.77,315.30 301.85,318.73 304.93,321.83 308.01,324.63 311.09,327.46 314.17,330.68 317.25,334.63 320.33,339.58 323.41,345.51 326.49,352.05 329.57,358.83 332.66,365.52 335.74,371.80 338.82,377.51 341.90,382.58 344.98,386.96 348.06,390.62 351.14,393.51 354.22,395.62 357.30,396.91 360.38,397.38 363.46,397.00 366.54,395.93 369.62,394.69 372.71,393.79 375.79,393.71 378.87,394.86 381.95,397.21 385.03,400.28 388.11,403.60 391.19,406.70 394.27,409.20 397.35,411.09 400.43,412.54 403.51,413.76 406.59,414.94 409.68,416.20 412.76,417.53 415.84,418.87 418.92,420.14 422.00,421.29 425.08,422.24 428.16,422.86 431.24,423.06 434.32,422.74 437.40,421.83 440.48,420.38 443.56,418.62 446.64,416.76 449.73,414.98 452.81,413.45 455.89,412.12 458.97,410.83 462.05,409.43 465.13,407.78 468.21,405.79 471.29,403.60 474.37,401.41 477.45,399.40 480.53,397.72 483.61,396.52 486.70,395.82 489.78,395.65 492.86,396.04 495.94,396.99 499.02,398.41 502.10,400.11 505.18,401.92 508.26,403.66 511.34,405.21 514.42,406.52 517.50,407.64 520.58,408.58 523.66,409.39 526.75,410.14 529.83,411.01 532.91,412.23 535.99,413.99 539.07,416.46 542.15,419.63 545.23,423.13 548.31,426.58 551.39,429.63 554.47,431.94 557.55,433.45 560.63,434.32 563.72,434.72 566.80,434.82 569.88,434.76 572.96,434.59 576.04,434.32 579.12,433.93 582.20,433.42 585.28,432.81 588.36,432.28 591.44,432.01 594.52,432.21 597.60,433.02 600.68,434.47 603.77,436.30 606.85,438.26 609.93,440.11 613.01,441.61 616.09,442.70 619.17,443.44 622.25,443.90 625.33,444.14 628.41,444.24 631.49,444.16 634.57,443.83 637.65,443.18 640.74,442.13 643.82,440.68 646.90,438.92 649.98,437.01 653.06,435.06 656.14,433.22 659.22,431.56 662.30,430.15 665.38,429.02 668.46,428.21 671.54,427.74 674.62,427.66 677.70,428.05 680.79,428.97 683.87,430.47 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,134.84 73.87,134.83 76.95,134.90 80.03,135.13 83.11,135.61 86.19,136.43 89.27,137.56 92.35,138.90 95.43,140.33 98.51,141.75 101.59,143.07 104.68,144.45 107.76,146.19 110.84,148.57 113.92,151.84 117.00,156.09 120.08,160.79 123.16,165.27 126.24,168.86 129.32,170.98 132.40,171.30 135.48,169.92 138.56,167.02 141.65,162.82 144.73,157.51 147.81,151.39 150.89,144.87 153.97,138.33 157.05,132.13 160.13,126.58 163.21,122.13 166.29,119.28 169.37,118.50 172.45,120.16 175.53,124.47 178.61,130.89 181.70,138.72 184.78,147.27 187.86,155.93 190.94,164.25 194.02,172.05 197.10,179.23 200.18,185.71 203.26,191.45 206.34,196.55 209.42,201.28 212.50,205.88 215.58,210.59 218.67,215.59 221.75,220.92 224.83,226.47 227.91,232.17 230.99,237.92 234.07,243.61 237.15,249.00 240.23,253.85 243.31,257.92 246.39,261.01 249.47,263.15 252.55,264.78 255.63,266.41 258.72,268.49 261.80,271.43 264.88,275.41 267.96,280.36 271.04,286.18 274.12,292.77 277.20,300.00 280.28,307.59 283.36,315.17 286.44,322.40 289.52,328.98 292.60,334.67 295.69,339.48 298.77,343.46 301.85,346.68 304.93,349.20 308.01,351.11 311.09,352.45 314.17,353.28 317.25,353.64 320.33,353.57 323.41,353.09 326.49,352.16 329.57,350.76 332.66,348.88 335.74,346.52 338.82,344.07 341.90,342.07 344.98,341.04 348.06,341.45 351.14,343.57 354.22,347.09 357.30,351.53 360.38,356.42 363.46,361.34 366.54,366.05 369.62,370.75 372.71,375.66 375.79,380.99 378.87,386.95 381.95,393.52 385.03,400.45 388.11,407.50 391.19,414.42 394.27,421.00 397.35,426.97 400.43,432.05 403.51,435.99 406.59,438.58 409.68,439.72 412.76,439.75 415.84,439.11 418.92,438.19 422.00,437.40 425.08,436.95 428.16,436.82 431.24,436.92 434.32,437.16 437.40,437.46 440.48,437.57 443.56,437.10 446.64,435.68 449.73,432.99 452.81,428.79 455.89,423.29 458.97,417.00 462.05,410.36 465.13,403.81 468.21,397.71 471.29,392.17 474.37,387.25 477.45,382.99 480.53,379.40 483.61,376.49 486.70,374.29 489.78,372.82 492.86,372.09 495.94,372.12 499.02,372.89 502.10,374.35 505.18,376.45 508.26,379.15 511.34,382.40 514.42,386.05 517.50,389.89 520.58,393.76 523.66,397.49 526.75,400.96 529.83,404.18 532.91,407.19 535.99,410.03 539.07,412.75 542.15,415.39 545.23,418.02 548.31,420.70 551.39,423.47 554.47,426.38 557.55,429.40 560.63,432.46 563.72,435.47 566.80,438.36 569.88,441.07 572.96,443.59 576.04,445.92 579.12,448.08 582.20,450.10 585.28,451.98 588.36,453.71 591.44,455.28 594.52,456.67 597.60,457.87 600.68,458.81 603.77,459.30 606.85,459.17 609.93,458.25 613.01,456.41 616.09,453.79 619.17,450.77 622.25,447.76 625.33,445.10 628.41,443.07 631.49,441.59 634.57,440.37 637.65,439.14 640.74,437.66 643.82,435.71 646.90,433.30 649.98,430.45 653.06,427.20 656.14,423.61 659.22,419.77 662.30,415.84 665.38,412.01 668.46,408.42 671.54,405.22 674.62,402.43 677.70,400.03 680.79,397.95 683.87,396.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,146.48 73.87,146.82 76.95,147.62 80.03,148.80 83.11,150.30 86.19,152.05 89.27,153.88 92.35,155.55 95.43,156.79 98.51,157.40 101.59,157.21 104.68,156.34 107.76,155.09 110.84,153.75 113.92,152.61 117.00,151.85 120.08,151.46 123.16,151.37 126.24,151.49 129.32,151.73 132.40,152.01 135.48,152.22 138.56,152.27 141.65,152.09 144.73,151.62 147.81,150.84 150.89,149.81 153.97,148.61 157.05,147.29 160.13,145.92 163.21,144.64 166.29,143.63 169.37,143.05 172.45,143.03 175.53,143.70 178.61,145.07 181.70,147.15 184.78,149.92 187.86,153.38 190.94,157.47 194.02,162.04 197.10,166.92 200.18,171.98 203.26,177.09 206.34,182.27 209.42,187.67 212.50,193.44 215.58,199.72 218.67,206.61 221.75,213.81 224.83,220.81 227.91,227.15 230.99,232.39 234.07,236.27 237.15,239.12 240.23,241.45 243.31,243.72 246.39,246.39 249.47,249.69 252.55,253.51 255.63,257.69 258.72,262.05 261.80,266.43 264.88,270.82 267.96,275.35 271.04,280.19 274.12,285.47 277.20,291.30 280.28,297.57 283.36,304.08 286.44,310.63 289.52,317.04 292.60,323.15 295.69,328.92 298.77,334.35 301.85,339.43 304.93,344.16 308.01,348.52 311.09,352.39 314.17,355.67 317.25,358.25 320.33,360.06 323.41,361.25 326.49,362.20 329.57,363.28 332.66,364.84 335.74,367.14 338.82,369.95 341.90,372.78 344.98,375.16 348.06,376.64 351.14,376.95 354.22,376.28 357.30,374.99 360.38,373.41 363.46,371.87 366.54,370.64 369.62,369.88 372.71,369.77 375.79,370.42 378.87,371.94 381.95,374.29 385.03,377.26 388.11,380.69 391.19,384.38 394.27,388.19 397.35,392.08 400.43,396.09 403.51,400.26 406.59,404.65 409.68,409.24 412.76,413.86 415.84,418.29 418.92,422.32 422.00,425.76 425.08,428.48 428.16,430.38 431.24,431.39 434.32,431.46 437.40,430.55 440.48,428.81 443.56,426.53 446.64,424.02 449.73,421.55 452.81,419.38 455.89,417.64 458.97,416.40 462.05,415.73 465.13,415.67 468.21,416.19 471.29,417.02 474.37,417.86 477.45,418.41 480.53,418.39 483.61,417.69 486.70,416.38 489.78,414.59 492.86,412.46 495.94,410.11 499.02,407.70 502.10,405.42 505.18,403.45 508.26,401.93 511.34,401.01 514.42,400.67 517.50,400.85 520.58,401.47 523.66,402.45 526.75,403.74 529.83,405.26 532.91,406.96 535.99,408.78 539.07,410.69 542.15,412.65 545.23,414.67 548.31,416.77 551.39,418.96 554.47,421.24 557.55,423.59 560.63,425.94 563.72,428.24 566.80,430.41 569.88,432.42 572.96,434.31 576.04,436.13 579.12,437.97 582.20,439.89 585.28,441.89 588.36,443.80 591.44,445.38 594.52,446.44 597.60,446.79 600.68,446.42 603.77,445.62 606.85,444.69 609.93,443.94 613.01,443.63 616.09,443.82 619.17,444.44 622.25,445.36 625.33,446.48 628.41,447.69 631.49,448.80 634.57,449.63 637.65,450.01 640.74,449.76 643.82,448.81 646.90,447.36 649.98,445.63 653.06,443.85 656.14,442.23 659.22,440.85 662.30,439.58 665.38,438.26 668.46,436.75 671.54,434.92 674.62,432.76 677.70,430.38 680.79,427.89 683.87,425.41 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,144.10 73.87,144.36 76.95,144.73 80.03,144.86 83.11,144.44 86.19,143.17 89.27,141.23 92.35,139.28 95.43,137.99 98.51,137.97 101.59,139.70 104.68,142.84 107.76,146.60 110.84,150.21 113.92,152.94 117.00,154.29 120.08,154.45 123.16,153.84 126.24,152.88 129.32,151.95 132.40,151.26 135.48,150.67 138.56,150.00 141.65,149.04 144.73,147.64 147.81,145.83 150.89,143.95 153.97,142.30 157.05,141.16 160.13,140.78 163.21,141.19 166.29,142.28 169.37,143.95 172.45,146.10 175.53,148.61 178.61,151.38 181.70,154.31 184.78,157.31 187.86,160.31 190.94,163.25 194.02,166.15 197.10,169.02 200.18,171.88 203.26,174.77 206.34,177.79 209.42,181.16 212.50,185.08 215.58,189.74 218.67,195.28 221.75,201.62 224.83,208.59 227.91,215.99 230.99,223.64 234.07,231.37 237.15,238.88 240.23,245.86 243.31,252.03 246.39,257.16 249.47,261.20 252.55,264.47 255.63,267.31 258.72,270.07 261.80,273.04 264.88,276.34 267.96,279.89 271.04,283.57 274.12,287.30 277.20,290.99 280.28,294.64 283.36,298.36 286.44,302.21 289.52,306.28 292.60,310.62 295.69,315.23 298.77,320.10 301.85,325.21 304.93,330.54 308.01,335.97 311.09,341.18 314.17,345.85 317.25,349.67 320.33,352.39 323.41,354.03 326.49,354.92 329.57,355.39 332.66,355.75 335.74,356.28 338.82,357.22 341.90,358.79 344.98,361.17 348.06,364.52 351.14,368.89 354.22,374.03 357.30,379.59 360.38,385.25 363.46,390.72 366.54,395.77 369.62,400.30 372.71,404.24 375.79,407.54 378.87,410.17 381.95,412.03 385.03,413.00 388.11,412.96 391.19,411.81 394.27,409.50 397.35,406.52 400.43,403.55 403.51,401.27 406.59,400.27 409.68,400.94 412.76,402.86 415.84,405.42 418.92,408.05 422.00,410.21 425.08,411.61 428.16,412.51 431.24,413.19 434.32,413.95 437.40,415.06 440.48,416.57 443.56,418.33 446.64,420.18 449.73,421.97 452.81,423.55 455.89,424.84 458.97,425.81 462.05,426.41 465.13,426.62 468.21,426.42 471.29,425.74 474.37,424.55 477.45,422.79 480.53,420.43 483.61,417.48 486.70,414.02 489.78,410.16 492.86,406.00 495.94,401.61 499.02,397.26 502.10,393.34 505.18,390.20 508.26,388.19 511.34,387.55 514.42,388.10 517.50,389.46 520.58,391.26 523.66,393.14 526.75,394.88 529.83,396.66 532.91,398.75 535.99,401.40 539.07,404.88 542.15,409.23 545.23,414.22 548.31,419.57 551.39,425.02 554.47,430.32 557.55,435.19 560.63,439.35 563.72,442.54 566.80,444.52 569.88,445.14 572.96,444.65 576.04,443.50 579.12,442.09 582.20,440.84 585.28,440.01 588.36,439.51 591.44,439.16 594.52,438.78 597.60,438.19 600.68,437.34 603.77,436.37 606.85,435.44 609.93,434.71 613.01,434.31 616.09,434.22 619.17,434.29 622.25,434.35 625.33,434.25 628.41,433.89 631.49,433.40 634.57,433.04 637.65,433.05 640.74,433.65 643.82,434.96 646.90,436.82 649.98,438.97 653.06,441.19 656.14,443.26 659.22,445.05 662.30,446.56 665.38,447.80 668.46,448.82 671.54,449.64 674.62,450.32 677.70,450.98 680.79,451.71 683.87,452.60 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,89.98 73.87,90.57 76.95,91.91 80.03,93.83 83.11,96.18 86.19,98.78 89.27,101.54 92.35,104.43 95.43,107.42 98.51,110.51 101.59,113.67 104.68,116.86 107.76,119.98 110.84,122.98 113.92,125.78 117.00,128.32 120.08,130.51 123.16,132.28 126.24,133.55 129.32,134.26 132.40,134.44 135.48,134.26 138.56,133.92 141.65,133.62 144.73,133.52 147.81,133.73 150.89,134.31 153.97,135.30 157.05,136.72 160.13,138.62 163.21,141.08 166.29,144.23 169.37,148.19 172.45,153.05 175.53,158.85 178.61,165.32 181.70,172.14 184.78,179.01 187.86,185.63 190.94,191.80 194.02,197.38 197.10,202.28 200.18,206.40 203.26,209.70 206.34,212.21 209.42,214.09 212.50,215.48 215.58,216.54 218.67,217.38 221.75,218.14 224.83,218.96 227.91,219.96 230.99,221.22 234.07,222.82 237.15,224.65 240.23,226.59 243.31,228.52 246.39,230.32 249.47,232.02 252.55,233.96 255.63,236.49 258.72,239.95 261.80,244.63 264.88,250.56 267.96,257.51 271.04,265.27 274.12,273.60 277.20,282.29 280.28,291.22 283.36,300.27 286.44,309.37 289.52,318.44 292.60,327.39 295.69,335.94 298.77,343.79 301.85,350.68 304.93,356.37 308.01,360.76 311.09,364.08 314.17,366.57 317.25,368.47 320.33,370.00 323.41,371.21 326.49,371.96 329.57,372.12 332.66,371.55 335.74,370.17 338.82,368.17 341.90,365.88 344.98,363.62 348.06,361.70 351.14,360.35 354.22,359.60 357.30,359.45 360.38,359.87 363.46,360.82 366.54,362.23 369.62,363.95 372.71,365.80 375.79,367.65 378.87,369.36 381.95,371.04 385.03,372.97 388.11,375.46 391.19,378.76 394.27,383.10 397.35,388.35 400.43,394.19 403.51,400.34 406.59,406.50 409.68,412.45 412.76,418.09 415.84,423.36 418.92,428.23 422.00,432.66 425.08,436.67 428.16,440.34 431.24,443.75 434.32,446.99 437.40,450.12 440.48,452.94 443.56,454.97 446.64,455.76 449.73,454.91 452.81,452.08 455.89,447.44 458.97,441.42 462.05,434.42 465.13,426.84 468.21,419.03 471.29,411.30 474.37,403.91 477.45,397.09 480.53,391.04 483.61,385.94 486.70,381.91 489.78,379.10 492.86,377.61 495.94,377.51 499.02,378.64 502.10,380.66 505.18,383.19 508.26,385.92 511.34,388.57 514.42,391.10 517.50,393.59 520.58,396.13 523.66,398.81 526.75,401.71 529.83,404.77 532.91,407.97 535.99,411.24 539.07,414.53 542.15,417.76 545.23,420.77 548.31,423.40 551.39,425.50 554.47,426.95 557.55,427.88 560.63,428.60 563.72,429.44 566.80,430.71 569.88,432.62 572.96,434.99 576.04,437.47 579.12,439.69 582.20,441.31 585.28,442.12 588.36,442.20 591.44,441.74 594.52,440.92 597.60,439.90 600.68,438.81 603.77,437.75 606.85,436.78 609.93,435.96 613.01,435.33 616.09,434.88 619.17,434.57 622.25,434.34 625.33,434.13 628.41,433.92 631.49,433.83 634.57,434.07 637.65,434.83 640.74,436.27 643.82,438.49 646.90,441.28 649.98,444.39 653.06,447.60 656.14,450.67 659.22,453.48 662.30,456.06 665.38,458.44 668.46,460.68 671.54,462.82 674.62,464.84 677.70,466.66 680.79,468.19 683.87,469.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,240.21 73.87,238.50 76.95,234.75 80.03,229.53 83.11,223.41 86.19,216.95 89.27,210.40 92.35,203.64 95.43,196.56 98.51,188.99 101.59,180.85 104.68,172.35 107.76,163.89 110.84,155.85 113.92,148.58 117.00,142.33 120.08,137.14 123.16,132.97 126.24,129.74 129.32,127.39 132.40,125.78 135.48,124.67 138.56,123.79 141.65,122.91 144.73,121.82 147.81,120.66 150.89,119.87 153.97,119.90 157.05,121.19 160.13,124.06 163.21,128.36 166.29,133.68 169.37,139.58 172.45,145.71 175.53,151.71 178.61,157.39 181.70,162.62 184.78,167.25 187.86,171.22 190.94,174.57 194.02,177.67 197.10,180.93 200.18,184.71 203.26,189.33 206.34,194.80 209.42,200.77 212.50,206.92 215.58,212.91 218.67,218.46 221.75,223.45 224.83,227.82 227.91,231.57 230.99,234.68 234.07,237.20 237.15,239.31 240.23,241.25 243.31,243.23 246.39,245.45 249.47,248.03 252.55,251.01 255.63,254.38 258.72,258.12 261.80,262.24 264.88,266.77 267.96,271.87 271.04,277.63 274.12,284.19 277.20,291.61 280.28,299.66 283.36,307.95 286.44,316.12 289.52,323.82 292.60,330.78 295.69,336.78 298.77,341.67 301.85,345.33 304.93,347.65 308.01,348.61 311.09,348.38 314.17,347.14 317.25,345.06 320.33,342.31 323.41,339.31 326.49,336.69 329.57,335.07 332.66,335.00 335.74,336.91 338.82,340.60 341.90,345.57 344.98,351.31 348.06,357.34 351.14,363.22 354.22,368.64 357.30,373.29 360.38,376.95 363.46,379.40 366.54,380.64 369.62,381.02 372.71,380.92 375.79,380.71 378.87,380.72 381.95,381.19 385.03,382.29 388.11,384.15 391.19,386.88 394.27,390.55 397.35,395.11 400.43,400.47 403.51,406.49 406.59,413.09 409.68,420.12 412.76,427.28 415.84,434.25 418.92,440.75 422.00,446.51 425.08,451.31 428.16,454.99 431.24,457.42 434.32,458.48 437.40,458.08 440.48,456.23 443.56,453.01 446.64,448.54 449.73,442.91 452.81,436.23 455.89,428.84 458.97,421.16 462.05,413.60 465.13,406.50 468.21,400.15 471.29,394.61 474.37,389.87 477.45,385.92 480.53,382.73 483.61,380.28 486.70,378.53 489.78,377.45 492.86,377.04 495.94,377.24 499.02,377.96 502.10,378.97 505.18,380.09 508.26,381.13 511.34,381.97 514.42,382.74 517.50,383.67 520.58,385.02 523.66,387.01 526.75,389.81 529.83,393.38 532.91,397.68 535.99,402.64 539.07,408.17 542.15,414.17 545.23,420.39 548.31,426.61 551.39,432.62 554.47,438.25 557.55,443.33 560.63,447.76 563.72,451.45 566.80,454.31 569.88,456.29 572.96,457.48 576.04,458.01 579.12,458.01 582.20,457.61 585.28,456.91 588.36,455.89 591.44,454.52 594.52,452.76 597.60,450.58 600.68,448.04 603.77,445.33 606.85,442.66 609.93,440.24 613.01,438.23 616.09,436.72 619.17,435.71 622.25,435.18 625.33,435.12 628.41,435.49 631.49,436.17 634.57,437.00 637.65,437.84 640.74,438.53 643.82,438.98 646.90,439.13 649.98,438.94 653.06,438.39 656.14,437.47 659.22,436.21 662.30,434.75 665.38,433.22 668.46,431.75 671.54,430.46 674.62,429.42 677.70,428.71 680.79,428.35 683.87,428.39 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,135.03 73.87,134.94 76.95,134.89 80.03,135.10 83.11,135.79 86.19,137.13 89.27,139.06 92.35,141.21 95.43,143.25 98.51,144.84 101.59,145.70 104.68,145.89 107.76,145.60 110.84,145.05 113.92,144.46 117.00,143.95 120.08,143.48 123.16,142.94 126.24,142.21 129.32,141.19 132.40,139.91 135.48,138.73 138.56,138.03 141.65,138.15 144.73,139.41 147.81,141.81 150.89,145.09 153.97,148.93 157.05,153.08 160.13,157.26 163.21,161.22 166.29,164.69 169.37,167.45 172.45,169.30 175.53,170.18 178.61,170.37 181.70,170.29 184.78,170.32 187.86,170.83 190.94,172.02 194.02,173.80 197.10,176.06 200.18,178.67 203.26,181.51 206.34,184.53 209.42,187.71 212.50,191.08 215.58,194.65 218.67,198.43 221.75,202.47 224.83,206.85 227.91,211.63 230.99,216.86 234.07,222.55 237.15,228.41 240.23,234.10 243.31,239.32 246.39,243.76 249.47,247.38 252.55,250.50 255.63,253.51 258.72,256.78 261.80,260.62 264.88,265.19 267.96,270.40 271.04,276.17 274.12,282.43 277.20,289.07 280.28,296.04 283.36,303.32 286.44,310.88 289.52,318.68 292.60,326.63 295.69,334.26 298.77,341.06 301.85,346.54 304.93,350.26 308.01,352.13 311.09,352.71 314.17,352.61 317.25,352.45 320.33,352.73 323.41,353.65 326.49,355.03 329.57,356.64 332.66,358.30 335.74,359.80 338.82,361.17 341.90,362.53 344.98,363.98 348.06,365.63 351.14,367.55 354.22,369.58 357.30,371.52 360.38,373.19 363.46,374.41 366.54,375.17 369.62,375.70 372.71,376.29 375.79,377.20 378.87,378.66 381.95,380.77 385.03,383.44 388.11,386.62 391.19,390.21 394.27,394.14 397.35,398.31 400.43,402.58 403.51,406.87 406.59,411.06 409.68,415.10 412.76,418.99 415.84,422.78 418.92,426.48 422.00,430.14 425.08,433.67 428.16,436.76 431.24,439.08 434.32,440.34 437.40,440.27 440.48,438.84 443.56,436.23 446.64,432.65 449.73,428.29 452.81,423.35 455.89,418.15 458.97,413.05 462.05,408.41 465.13,404.51 468.21,401.59 471.29,399.66 474.37,398.66 477.45,398.55 480.53,399.25 483.61,400.62 486.70,402.31 489.78,404.02 492.86,405.44 495.94,406.32 499.02,406.59 502.10,406.39 505.18,405.85 508.26,405.11 511.34,404.30 514.42,403.61 517.50,403.22 520.58,403.30 523.66,404.00 526.75,405.40 529.83,407.38 532.91,409.80 535.99,412.48 539.07,415.28 542.15,418.10 545.23,420.90 548.31,423.65 551.39,426.35 554.47,428.97 557.55,431.42 560.63,433.54 563.72,435.18 566.80,436.19 569.88,436.48 572.96,436.20 576.04,435.65 579.12,435.07 582.20,434.72 585.28,434.75 588.36,435.06 591.44,435.46 594.52,435.79 597.60,435.89 600.68,435.66 603.77,435.11 606.85,434.26 609.93,433.14 613.01,431.78 616.09,430.28 619.17,428.78 622.25,427.41 625.33,426.29 628.41,425.53 631.49,425.16 634.57,425.22 637.65,425.72 640.74,426.66 643.82,428.04 646.90,429.86 649.98,432.09 653.06,434.72 656.14,437.73 659.22,441.05 662.30,444.50 665.38,447.91 668.46,451.13 671.54,454.01 674.62,456.50 677.70,458.64 680.79,460.46 683.87,462.00 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,178.95 73.87,178.95 76.95,178.89 80.03,178.68 83.11,178.25 86.19,177.52 89.27,176.43 92.35,174.88 95.43,172.78 98.51,170.07 101.59,166.68 104.68,162.75 107.76,158.46 110.84,154.04 113.92,149.64 117.00,145.43 120.08,141.53 123.16,138.00 126.24,134.93 129.32,132.36 132.40,130.34 135.48,128.91 138.56,128.08 141.65,127.88 144.73,128.32 147.81,129.37 150.89,130.98 153.97,133.10 157.05,135.66 160.13,138.62 163.21,141.78 166.29,144.90 169.37,147.74 172.45,150.12 175.53,151.92 178.61,153.48 181.70,155.21 184.78,157.51 187.86,160.76 190.94,165.09 194.02,170.19 197.10,175.72 200.18,181.33 203.26,186.73 206.34,191.71 209.42,196.21 212.50,200.19 215.58,203.63 218.67,206.51 221.75,209.05 224.83,211.57 227.91,214.33 230.99,217.63 234.07,221.62 237.15,226.25 240.23,231.36 243.31,236.80 246.39,242.43 249.47,248.12 252.55,253.83 255.63,259.50 258.72,265.08 261.80,270.56 264.88,276.00 267.96,281.61 271.04,287.55 274.12,294.01 277.20,301.11 280.28,308.68 283.36,316.39 286.44,323.93 289.52,331.02 292.60,337.41 295.69,342.91 298.77,347.36 301.85,350.65 304.93,352.67 308.01,353.51 311.09,353.68 314.17,353.68 317.25,354.02 320.33,355.11 323.41,356.92 326.49,359.01 329.57,360.88 332.66,362.09 335.74,362.28 338.82,361.67 341.90,360.80 344.98,360.16 348.06,360.26 351.14,361.38 354.22,363.28 357.30,365.54 360.38,367.75 363.46,369.56 366.54,370.79 369.62,371.68 372.71,372.51 375.79,373.53 378.87,375.00 381.95,377.04 385.03,379.66 388.11,382.88 391.19,386.66 394.27,390.98 397.35,395.66 400.43,400.44 403.51,405.07 406.59,409.35 409.68,413.10 412.76,416.37 415.84,419.22 418.92,421.75 422.00,424.04 425.08,426.11 428.16,427.90 431.24,429.35 434.32,430.37 437.40,430.92 440.48,431.00 443.56,430.74 446.64,430.22 449.73,429.54 452.81,428.76 455.89,427.69 458.97,426.06 462.05,423.56 465.13,419.94 468.21,415.10 471.29,409.46 474.37,403.54 477.45,397.83 480.53,392.81 483.61,388.80 486.70,385.89 489.78,384.16 492.86,383.62 495.94,384.30 499.02,385.98 502.10,388.26 505.18,390.76 508.26,393.12 511.34,395.06 514.42,396.57 517.50,397.80 520.58,398.89 523.66,399.99 526.75,401.24 529.83,402.70 532.91,404.41 535.99,406.42 539.07,408.75 542.15,411.36 545.23,414.08 548.31,416.76 551.39,419.24 554.47,421.37 557.55,423.20 560.63,424.90 563.72,426.66 566.80,428.67 569.88,431.05 572.96,433.76 576.04,436.67 579.12,439.64 582.20,442.54 585.28,445.26 588.36,447.78 591.44,450.09 594.52,452.17 597.60,454.02 600.68,455.63 603.77,456.95 606.85,457.94 609.93,458.55 613.01,458.75 616.09,458.53 619.17,457.92 622.25,456.94 625.33,455.61 628.41,453.97 631.49,452.12 634.57,450.18 637.65,448.29 640.74,446.56 643.82,445.07 646.90,443.96 649.98,443.31 653.06,443.23 656.14,443.77 659.22,444.95 662.30,446.62 665.38,448.64 668.46,450.88 671.54,453.21 674.62,455.53 677.70,457.74 680.79,459.78 683.87,461.58 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,47.03 73.87,47.87 76.95,49.71 80.03,52.28 83.11,55.28 86.19,58.45 89.27,61.67 92.35,64.99 95.43,68.49 98.51,72.24 101.59,76.31 104.68,80.88 107.76,86.18 110.84,92.41 113.92,99.75 117.00,108.29 120.08,117.69 123.16,127.50 126.24,137.31 129.32,146.75 132.40,155.43 135.48,162.92 138.56,168.83 141.65,172.82 144.73,174.60 147.81,174.28 150.89,172.36 153.97,169.38 157.05,165.82 160.13,162.14 163.21,158.64 166.29,155.56 169.37,153.09 172.45,151.38 175.53,150.56 178.61,150.67 181.70,151.73 184.78,153.75 187.86,156.71 190.94,160.55 194.02,165.02 197.10,169.89 200.18,174.91 203.26,179.89 206.34,184.74 209.42,189.46 212.50,194.09 215.58,198.64 218.67,203.18 221.75,207.84 224.83,212.82 227.91,218.30 230.99,224.44 234.07,231.30 237.15,238.55 240.23,245.75 243.31,252.52 246.39,258.48 249.47,263.41 252.55,267.36 255.63,270.43 258.72,272.71 261.80,274.33 264.88,275.53 267.96,276.73 271.04,278.32 274.12,280.65 277.20,284.02 280.28,288.40 283.36,293.59 286.44,299.42 289.52,305.67 292.60,312.16 295.69,318.58 298.77,324.63 301.85,330.03 304.93,334.55 308.01,338.13 311.09,341.11 314.17,343.82 317.25,346.60 320.33,349.77 323.41,353.31 326.49,356.95 329.57,360.39 332.66,363.35 335.74,365.59 338.82,367.16 341.90,368.23 344.98,368.99 348.06,369.61 351.14,370.26 354.22,371.08 357.30,372.19 360.38,373.71 363.46,375.73 366.54,378.23 369.62,380.99 372.71,383.76 375.79,386.31 378.87,388.45 381.95,390.23 385.03,391.91 388.11,393.80 391.19,396.15 394.27,399.19 397.35,402.78 400.43,406.60 403.51,410.35 406.59,413.76 409.68,416.60 412.76,418.80 415.84,420.36 418.92,421.28 422.00,421.58 425.08,421.37 428.16,420.93 431.24,420.57 434.32,420.55 437.40,421.10 440.48,422.15 443.56,423.29 446.64,424.15 449.73,424.36 452.81,423.62 455.89,422.12 458.97,420.28 462.05,418.49 465.13,417.13 468.21,416.44 471.29,416.14 474.37,415.86 477.45,415.22 480.53,413.89 483.61,411.69 486.70,408.81 489.78,405.43 492.86,401.76 495.94,398.00 499.02,394.41 502.10,391.34 505.18,389.11 508.26,388.01 511.34,388.26 514.42,389.72 517.50,392.11 520.58,395.16 523.66,398.57 526.75,402.15 529.83,405.79 532.91,409.45 535.99,413.07 539.07,416.64 542.15,420.12 545.23,423.46 548.31,426.60 551.39,429.50 554.47,432.12 557.55,434.38 560.63,436.16 563.72,437.35 566.80,437.85 569.88,437.59 572.96,436.73 576.04,435.53 579.12,434.24 582.20,433.08 585.28,432.24 588.36,431.76 591.44,431.66 594.52,431.94 597.60,432.62 600.68,433.70 603.77,435.27 606.85,437.42 609.93,440.21 613.01,443.70 616.09,447.65 619.17,451.55 622.25,454.94 625.33,457.37 628.41,458.50 631.49,458.44 634.57,457.51 637.65,456.05 640.74,454.37 643.82,452.70 646.90,451.12 649.98,449.64 653.06,448.26 656.14,446.97 659.22,445.75 662.30,444.57 665.38,443.36 668.46,442.10 671.54,440.74 674.62,439.31 677.70,437.86 680.79,436.46 683.87,435.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,134.26 73.87,134.10 76.95,133.77 80.03,133.38 83.11,133.03 86.19,132.81 89.27,132.82 92.35,133.17 95.43,133.94 98.51,135.23 101.59,137.09 104.68,139.43 107.76,142.09 110.84,144.90 113.92,147.72 117.00,150.37 120.08,152.54 123.16,153.92 126.24,154.20 129.32,153.12 132.40,150.66 135.48,147.26 138.56,143.41 141.65,139.56 144.73,136.14 147.81,133.42 150.89,131.54 153.97,130.61 157.05,130.69 160.13,131.84 163.21,133.97 166.29,136.90 169.37,140.49 172.45,144.57 175.53,149.02 178.61,153.68 181.70,158.39 184.78,163.04 187.86,167.50 190.94,171.73 194.02,175.80 197.10,179.77 200.18,183.73 203.26,187.74 206.34,191.85 209.42,196.06 212.50,200.39 215.58,204.82 218.67,209.37 221.75,214.08 224.83,219.01 227.91,224.22 230.99,229.78 234.07,235.67 237.15,241.67 240.23,247.48 243.31,252.85 246.39,257.54 249.47,261.47 252.55,264.92 255.63,268.18 258.72,271.54 261.80,275.27 264.88,279.40 267.96,283.78 271.04,288.23 274.12,292.60 277.20,296.73 280.28,300.68 283.36,304.61 286.44,308.68 289.52,313.01 292.60,317.70 295.69,322.59 298.77,327.45 301.85,332.09 304.93,336.32 308.01,340.00 311.09,343.13 314.17,345.71 317.25,347.75 320.33,349.26 323.41,350.31 326.49,350.99 329.57,351.39 332.66,351.61 335.74,351.71 338.82,351.86 341.90,352.22 344.98,352.96 348.06,354.20 351.14,356.07 354.22,358.54 357.30,361.60 360.38,365.19 363.46,369.29 366.54,373.80 369.62,378.54 372.71,383.32 375.79,387.98 378.87,392.36 381.95,396.36 385.03,399.89 388.11,402.90 391.19,405.33 394.27,407.18 397.35,408.59 400.43,409.83 403.51,411.15 406.59,412.77 409.68,414.80 412.76,417.03 415.84,419.14 418.92,420.83 422.00,421.83 425.08,422.06 428.16,421.78 431.24,421.30 434.32,420.89 437.40,420.83 440.48,421.18 443.56,421.85 446.64,422.70 449.73,423.63 452.81,424.52 455.89,425.21 458.97,425.52 462.05,425.29 465.13,424.38 468.21,422.70 471.29,420.27 474.37,417.16 477.45,413.44 480.53,409.18 483.61,404.52 486.70,399.78 489.78,395.26 492.86,391.24 495.94,387.98 499.02,385.62 502.10,384.25 505.18,383.89 508.26,384.59 511.34,386.35 514.42,388.99 517.50,392.24 520.58,395.85 523.66,399.61 526.75,403.31 529.83,406.82 532.91,410.04 535.99,412.86 539.07,415.22 542.15,417.07 545.23,418.43 548.31,419.32 551.39,419.76 554.47,419.79 557.55,419.56 560.63,419.32 563.72,419.32 566.80,419.79 569.88,420.89 572.96,422.51 576.04,424.39 579.12,426.29 582.20,427.97 585.28,429.27 588.36,430.19 591.44,430.80 594.52,431.16 597.60,431.34 600.68,431.42 603.77,431.55 606.85,431.88 609.93,432.52 613.01,433.58 616.09,435.15 619.17,437.24 622.25,439.88 625.33,443.10 628.41,446.87 631.49,451.05 634.57,455.42 637.65,459.78 640.74,463.94 643.82,467.78 646.90,471.27 649.98,474.44 653.06,477.34 656.14,479.98 659.22,482.50 662.30,485.15 665.38,488.20 668.46,491.87 671.54,496.39 674.62,501.76 677.70,507.82 680.79,514.41 683.87,521.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,149.78 73.87,149.83 76.95,149.99 80.03,150.30 83.11,150.81 86.19,151.55 89.27,152.49 92.35,153.53 95.43,154.56 98.51,155.49 101.59,156.25 104.68,156.83 107.76,157.30 110.84,157.70 113.92,158.09 117.00,158.48 120.08,158.78 123.16,158.84 126.24,158.53 129.32,157.73 132.40,156.43 135.48,154.84 138.56,153.17 141.65,151.64 144.73,150.44 147.81,149.63 150.89,149.16 153.97,148.94 157.05,148.90 160.13,148.95 163.21,148.95 166.29,148.69 169.37,148.01 172.45,146.74 175.53,144.86 178.61,142.85 181.70,141.29 184.78,140.74 187.86,141.70 190.94,144.39 194.02,148.53 197.10,153.74 200.18,159.66 203.26,165.97 206.34,172.57 209.42,179.63 212.50,187.31 215.58,195.78 218.67,205.14 221.75,214.94 224.83,224.47 227.91,233.04 230.99,240.01 234.07,245.03 237.15,248.57 240.23,251.33 243.31,254.02 246.39,257.25 249.47,261.39 252.55,266.30 255.63,271.76 258.72,277.54 261.80,283.43 264.88,289.14 267.96,294.38 271.04,298.85 274.12,302.29 277.20,304.52 280.28,305.68 283.36,306.14 286.44,306.23 289.52,306.27 292.60,306.53 295.69,307.18 298.77,308.34 301.85,310.11 304.93,312.58 308.01,315.83 311.09,320.01 314.17,325.25 317.25,331.66 320.33,339.33 323.41,347.99 326.49,357.03 329.57,365.87 332.66,373.95 335.74,380.81 338.82,386.34 341.90,390.60 344.98,393.69 348.06,395.72 351.14,396.77 354.22,396.81 357.30,395.81 360.38,393.72 363.46,390.51 366.54,386.32 369.62,381.70 372.71,377.19 375.79,373.29 378.87,370.45 381.95,368.95 385.03,368.87 388.11,370.26 391.19,373.15 394.27,377.52 397.35,383.09 400.43,389.49 403.51,396.32 406.59,403.25 409.68,410.01 412.76,416.45 415.84,422.50 418.92,428.11 422.00,433.21 425.08,437.77 428.16,441.68 431.24,444.86 434.32,447.23 437.40,448.73 440.48,449.35 443.56,449.16 446.64,448.22 449.73,446.59 452.81,444.32 455.89,441.43 458.97,437.91 462.05,433.76 465.13,428.96 468.21,423.54 471.29,417.67 474.37,411.52 477.45,405.28 480.53,399.08 483.61,393.14 486.70,387.73 489.78,383.11 492.86,379.52 495.94,377.15 499.02,375.93 502.10,375.53 505.18,375.63 508.26,375.91 511.34,376.10 514.42,376.15 517.50,376.10 520.58,375.98 523.66,375.86 526.75,375.83 529.83,376.05 532.91,376.73 535.99,378.04 539.07,380.16 542.15,383.15 545.23,386.98 548.31,391.58 551.39,396.90 554.47,402.85 557.55,409.17 560.63,415.41 563.72,421.16 566.80,426.02 569.88,429.72 572.96,432.44 576.04,434.58 579.12,436.56 582.20,438.76 585.28,441.44 588.36,444.59 591.44,448.10 594.52,451.87 597.60,455.79 600.68,459.72 603.77,463.47 606.85,466.86 609.93,469.72 613.01,471.91 616.09,473.47 619.17,474.59 622.25,475.48 625.33,476.32 628.41,477.24 631.49,478.04 634.57,478.37 637.65,477.89 640.74,476.29 643.82,473.43 646.90,469.64 649.98,465.39 653.06,461.09 656.14,457.14 659.22,453.76 662.30,450.86 665.38,448.30 668.46,445.94 671.54,443.68 674.62,441.58 677.70,439.94 680.79,439.00 683.87,439.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,101.65 73.87,102.03 76.95,102.75 80.03,103.51 83.11,104.04 86.19,104.10 89.27,103.78 92.35,103.53 95.43,103.80 98.51,105.00 101.59,107.48 104.68,111.26 107.76,116.15 110.84,121.95 113.92,128.47 117.00,135.48 120.08,142.47 123.16,148.90 126.24,154.28 129.32,158.17 132.40,160.35 135.48,161.06 138.56,160.59 141.65,159.23 144.73,157.24 147.81,154.84 150.89,152.15 153.97,149.31 157.05,146.40 160.13,143.54 163.21,141.09 166.29,139.57 169.37,139.44 172.45,141.12 175.53,144.81 178.61,150.03 181.70,156.07 184.78,162.28 187.86,168.05 190.94,173.11 194.02,177.75 197.10,182.35 200.18,187.30 203.26,192.93 206.34,199.25 209.42,205.89 212.50,212.48 215.58,218.66 218.67,224.15 221.75,228.90 224.83,232.98 227.91,236.51 230.99,239.59 234.07,242.33 237.15,244.84 240.23,247.24 243.31,249.63 246.39,252.12 249.47,254.76 252.55,257.57 255.63,260.58 258.72,263.78 261.80,267.19 264.88,270.80 267.96,274.62 271.04,278.67 274.12,282.95 277.20,287.46 280.28,292.24 283.36,297.33 286.44,302.78 289.52,308.62 292.60,314.81 295.69,321.04 298.77,326.91 301.85,332.07 304.93,336.18 308.01,339.12 311.09,341.10 314.17,342.39 317.25,343.26 320.33,343.93 323.41,344.66 326.49,345.66 329.57,347.16 332.66,349.33 335.74,352.29 338.82,355.90 341.90,359.82 344.98,363.75 348.06,367.42 351.14,370.60 354.22,373.28 357.30,375.50 360.38,377.29 363.46,378.73 366.54,379.91 369.62,381.06 372.71,382.40 375.79,384.13 378.87,386.44 381.95,389.27 385.03,392.40 388.11,395.58 391.19,398.58 394.27,401.20 397.35,403.50 400.43,405.62 403.51,407.72 406.59,409.94 409.68,412.41 412.76,415.17 415.84,418.22 418.92,421.58 422.00,425.24 425.08,429.02 428.16,432.44 431.24,434.97 434.32,436.16 437.40,435.61 440.48,433.46 443.56,430.38 446.64,427.04 449.73,424.07 452.81,421.98 455.89,420.67 458.97,419.71 462.05,418.69 465.13,417.20 468.21,414.98 471.29,412.18 474.37,409.10 477.45,405.99 480.53,403.13 483.61,400.69 486.70,398.71 489.78,397.23 492.86,396.25 495.94,395.77 499.02,395.74 502.10,396.04 505.18,396.56 508.26,397.21 511.34,397.90 514.42,398.60 517.50,399.33 520.58,400.08 523.66,400.88 526.75,401.74 529.83,402.68 532.91,403.72 535.99,404.89 539.07,406.21 542.15,407.74 545.23,409.66 548.31,412.12 551.39,415.26 554.47,419.22 557.55,423.86 560.63,428.81 563.72,433.72 566.80,438.26 569.88,442.14 572.96,445.20 576.04,447.36 579.12,448.55 582.20,448.74 585.28,447.94 588.36,446.40 591.44,444.43 594.52,442.29 597.60,440.23 600.68,438.45 603.77,437.00 606.85,435.94 609.93,435.31 613.01,435.11 616.09,435.31 619.17,435.80 622.25,436.48 625.33,437.25 628.41,438.03 631.49,438.80 634.57,439.54 637.65,440.26 640.74,440.97 643.82,441.68 646.90,442.39 649.98,443.14 653.06,443.92 656.14,444.76 659.22,445.66 662.30,446.68 665.38,447.82 668.46,449.13 671.54,450.61 674.62,452.16 677.70,453.55 680.79,454.57 683.87,455.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,108.13 73.87,108.53 76.95,109.44 80.03,110.76 83.11,112.40 86.19,114.25 89.27,116.21 92.35,118.17 95.43,120.02 98.51,121.66 101.59,123.05 104.68,124.28 107.76,125.56 110.84,127.09 113.92,129.05 117.00,131.55 120.08,134.45 123.16,137.53 126.24,140.60 129.32,143.45 132.40,145.95 135.48,148.05 138.56,149.72 141.65,150.94 144.73,151.71 147.81,152.21 150.89,152.82 153.97,153.90 157.05,155.78 160.13,158.73 163.21,162.48 166.29,166.52 169.37,170.32 172.45,173.42 175.53,175.51 178.61,176.83 181.70,177.79 184.78,178.77 187.86,180.15 190.94,182.08 194.02,184.29 197.10,186.48 200.18,188.33 203.26,189.60 206.34,190.28 209.42,190.70 212.50,191.18 215.58,192.02 218.67,193.47 221.75,195.69 224.83,198.74 227.91,202.65 230.99,207.45 234.07,213.14 237.15,219.52 240.23,226.39 243.31,233.54 246.39,240.78 249.47,247.95 252.55,254.84 255.63,261.30 258.72,267.18 261.80,272.35 264.88,276.95 267.96,281.33 271.04,285.85 274.12,290.84 277.20,296.55 280.28,302.76 283.36,309.02 286.44,314.86 289.52,319.87 292.60,323.79 295.69,326.91 298.77,329.65 301.85,332.42 304.93,335.62 308.01,339.44 311.09,343.73 314.17,348.27 317.25,352.88 320.33,357.36 323.41,361.50 326.49,365.05 329.57,367.80 332.66,369.55 335.74,370.17 338.82,369.71 341.90,368.38 344.98,366.36 348.06,363.82 351.14,361.01 354.22,358.39 357.30,356.48 360.38,355.75 363.46,356.62 366.54,359.20 369.62,363.07 372.71,367.75 375.79,372.79 378.87,377.76 381.95,382.40 385.03,386.59 388.11,390.28 391.19,393.39 394.27,395.91 397.35,398.06 400.43,400.17 403.51,402.55 406.59,405.47 409.68,409.11 412.76,413.24 415.84,417.52 418.92,421.65 422.00,425.32 425.08,428.37 428.16,430.80 431.24,432.67 434.32,434.02 437.40,434.90 440.48,435.30 443.56,435.13 446.64,434.30 449.73,432.72 452.81,430.36 455.89,427.47 458.97,424.45 462.05,421.68 465.13,419.49 468.21,418.12 471.29,417.43 474.37,417.17 477.45,417.11 480.53,417.03 483.61,416.76 486.70,416.25 489.78,415.44 492.86,414.31 495.94,412.82 499.02,410.97 502.10,408.75 505.18,406.17 508.26,403.23 511.34,399.96 514.42,396.56 517.50,393.30 520.58,390.44 523.66,388.21 526.75,386.78 529.83,386.17 532.91,386.33 535.99,387.21 539.07,388.77 542.15,390.98 545.23,393.88 548.31,397.51 551.39,401.89 554.47,407.06 557.55,412.76 560.63,418.47 563.72,423.70 566.80,428.02 569.88,431.07 572.96,433.01 576.04,434.23 579.12,435.13 582.20,436.06 585.28,437.31 588.36,438.91 591.44,440.83 594.52,443.04 597.60,445.47 600.68,448.02 603.77,450.47 606.85,452.61 609.93,454.24 613.01,455.21 616.09,455.48 619.17,455.18 622.25,454.44 625.33,453.38 628.41,452.11 631.49,450.68 634.57,449.14 637.65,447.51 640.74,445.81 643.82,444.09 646.90,442.50 649.98,441.22 653.06,440.40 656.14,440.19 659.22,440.59 662.30,441.45 665.38,442.58 668.46,443.81 671.54,444.97 674.62,446.02 677.70,447.02 680.79,448.02 683.87,449.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,114.66 73.87,115.38 76.95,117.17 80.03,120.03 83.11,123.93 86.19,128.82 89.27,134.45 92.35,140.32 95.43,145.95 98.51,150.91 101.59,154.83 104.68,157.56 107.76,159.10 110.84,159.45 113.92,158.65 117.00,156.77 120.08,154.08 123.16,150.88 126.24,147.46 129.32,144.07 132.40,140.94 135.48,138.24 138.56,136.12 141.65,134.71 144.73,134.11 147.81,134.35 150.89,135.36 153.97,137.07 157.05,139.44 160.13,142.37 163.21,145.64 166.29,148.95 169.37,152.01 172.45,154.58 175.53,156.50 178.61,158.04 181.70,159.52 184.78,161.28 187.86,163.63 190.94,166.75 194.02,170.63 197.10,175.23 200.18,180.46 203.26,186.28 206.34,192.48 209.42,198.74 212.50,204.74 215.58,210.20 218.67,214.91 221.75,218.86 224.83,222.23 227.91,225.16 230.99,227.81 234.07,230.30 237.15,232.61 240.23,234.71 243.31,236.56 246.39,238.10 249.47,239.41 252.55,240.79 255.63,242.55 258.72,245.00 261.80,248.36 264.88,252.64 267.96,257.52 271.04,262.71 274.12,267.91 277.20,272.91 280.28,277.81 283.36,282.95 286.44,288.62 289.52,295.10 292.60,302.58 295.69,310.88 298.77,319.74 301.85,328.90 304.93,338.12 308.01,347.13 311.09,355.59 314.17,363.17 317.25,369.58 320.33,374.58 323.41,378.09 326.49,380.17 329.57,380.92 332.66,380.44 335.74,378.86 338.82,376.67 341.90,374.54 344.98,373.09 348.06,372.87 351.14,374.22 354.22,376.75 357.30,379.86 360.38,383.00 363.46,385.64 366.54,387.47 369.62,388.61 372.71,389.21 375.79,389.45 378.87,389.50 381.95,389.50 385.03,389.53 388.11,389.68 391.19,390.02 394.27,390.60 397.35,391.45 400.43,392.57 403.51,393.95 406.59,395.59 409.68,397.53 412.76,399.90 415.84,402.87 418.92,406.60 422.00,411.24 425.08,416.71 428.16,422.58 431.24,428.38 434.32,433.68 437.40,438.07 440.48,441.25 443.56,442.95 446.64,442.96 449.73,441.10 452.81,437.26 455.89,431.83 458.97,425.38 462.05,418.51 465.13,411.72 468.21,405.46 471.29,399.94 474.37,395.28 477.45,391.59 480.53,388.94 483.61,387.31 486.70,386.55 489.78,386.50 492.86,386.99 495.94,387.87 499.02,389.00 502.10,390.21 505.18,391.37 508.26,392.34 511.34,393.06 514.42,393.71 517.50,394.63 520.58,396.13 523.66,398.48 526.75,401.82 529.83,405.78 532.91,409.89 535.99,413.70 539.07,416.78 542.15,418.98 545.23,420.53 548.31,421.73 551.39,422.86 554.47,424.19 557.55,425.82 560.63,427.72 563.72,429.84 566.80,432.11 569.88,434.50 572.96,437.00 576.04,439.62 579.12,442.40 582.20,445.35 585.28,448.45 588.36,451.56 591.44,454.52 594.52,457.16 597.60,459.34 600.68,461.01 603.77,462.25 606.85,463.16 609.93,463.84 613.01,464.36 616.09,464.67 619.17,464.55 622.25,463.81 625.33,462.27 628.41,459.79 631.49,456.59 634.57,453.01 637.65,449.38 640.74,446.02 643.82,443.17 646.90,440.89 649.98,439.17 653.06,438.01 656.14,437.38 659.22,437.21 662.30,437.36 665.38,437.66 668.46,437.99 671.54,438.19 674.62,438.16 677.70,437.75 680.79,436.84 683.87,435.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,113.49 73.87,114.14 76.95,115.50 80.03,117.32 83.11,119.30 86.19,121.19 89.27,122.80 92.35,124.01 95.43,124.74 98.51,124.92 101.59,124.52 104.68,123.92 107.76,123.70 110.84,124.42 113.92,126.59 117.00,130.44 120.08,135.30 123.16,140.23 126.24,144.34 129.32,146.83 132.40,147.34 135.48,146.37 138.56,144.57 141.65,142.55 144.73,140.86 147.81,139.81 150.89,139.38 153.97,139.54 157.05,140.25 160.13,141.44 163.21,143.00 166.29,144.82 169.37,146.81 172.45,148.85 175.53,150.91 178.61,153.16 181.70,155.82 184.78,159.09 187.86,163.16 190.94,168.08 194.02,173.62 197.10,179.49 200.18,185.46 203.26,191.29 206.34,196.77 209.42,201.72 212.50,205.99 215.58,209.45 218.67,212.01 221.75,214.02 224.83,216.03 227.91,218.57 230.99,222.10 234.07,226.95 237.15,232.84 240.23,239.35 243.31,246.07 246.39,252.63 249.47,258.70 252.55,264.11 255.63,268.70 258.72,272.37 261.80,275.02 264.88,276.92 267.96,278.65 271.04,280.81 274.12,283.94 277.20,288.46 280.28,294.21 283.36,300.68 286.44,307.41 289.52,313.92 292.60,319.90 295.69,325.45 298.77,330.79 301.85,336.15 304.93,341.75 308.01,347.63 311.09,353.53 314.17,359.11 317.25,364.11 320.33,368.26 323.41,371.36 326.49,373.34 329.57,374.11 332.66,373.61 335.74,371.85 338.82,369.22 341.90,366.32 344.98,363.73 348.06,361.95 351.14,361.36 354.22,361.83 357.30,363.11 360.38,364.93 363.46,367.07 366.54,369.36 369.62,371.83 372.71,374.55 375.79,377.57 378.87,380.95 381.95,384.63 385.03,388.48 388.11,392.33 391.19,396.06 394.27,399.55 397.35,402.83 400.43,405.99 403.51,409.12 406.59,412.32 409.68,415.62 412.76,418.84 415.84,421.79 418.92,424.25 422.00,426.05 425.08,427.12 428.16,427.57 431.24,427.56 434.32,427.22 437.40,426.69 440.48,425.97 443.56,424.99 446.64,423.67 449.73,421.91 452.81,419.67 455.89,417.14 458.97,414.66 462.05,412.52 465.13,411.01 468.21,410.27 471.29,409.98 474.37,409.76 477.45,409.22 480.53,407.99 483.61,405.95 486.70,403.38 489.78,400.62 492.86,397.98 495.94,395.73 499.02,393.98 502.10,392.64 505.18,391.61 508.26,390.78 511.34,390.07 514.42,389.53 517.50,389.26 520.58,389.38 523.66,389.96 526.75,391.10 529.83,392.79 532.91,395.00 535.99,397.72 539.07,400.92 542.15,404.53 545.23,408.40 548.31,412.37 551.39,416.31 554.47,420.10 557.55,423.68 560.63,427.11 563.72,430.42 566.80,433.65 569.88,436.84 572.96,439.85 576.04,442.50 579.12,444.61 582.20,446.01 585.28,446.62 588.36,446.56 591.44,446.03 594.52,445.21 597.60,444.26 600.68,443.28 603.77,442.22 606.85,441.05 609.93,439.70 613.01,438.13 616.09,436.36 619.17,434.50 622.25,432.65 625.33,430.89 628.41,429.30 631.49,427.95 634.57,426.88 637.65,426.14 640.74,425.76 643.82,425.74 646.90,425.95 649.98,426.23 653.06,426.46 656.14,426.50 659.22,426.35 662.30,426.19 665.38,426.24 668.46,426.68 671.54,427.68 674.62,429.31 677.70,431.52 680.79,434.26 683.87,437.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,141.63 73.87,141.58 76.95,141.52 80.03,141.55 83.11,141.77 86.19,142.25 89.27,142.99 92.35,143.87 95.43,144.79 98.51,145.63 101.59,146.31 104.68,146.88 107.76,147.44 110.84,148.11 113.92,148.98 117.00,150.10 120.08,151.19 123.16,151.95 126.24,152.06 129.32,151.25 132.40,149.48 135.48,147.25 138.56,145.08 141.65,143.46 144.73,142.85 147.81,143.27 150.89,144.39 153.97,145.80 157.05,147.14 160.13,148.12 163.21,148.79 166.29,149.45 169.37,150.37 172.45,151.81 175.53,153.94 178.61,156.64 181.70,159.68 184.78,162.84 187.86,165.92 190.94,168.85 194.02,171.82 197.10,175.06 200.18,178.78 203.26,183.16 206.34,188.21 209.42,193.77 212.50,199.66 215.58,205.71 218.67,211.76 221.75,217.67 224.83,223.28 227.91,228.48 230.99,233.15 234.07,237.23 237.15,240.84 240.23,244.11 243.31,247.21 246.39,250.27 249.47,253.42 252.55,256.84 255.63,260.69 258.72,265.10 261.80,270.21 264.88,275.92 267.96,281.97 271.04,288.08 274.12,294.00 277.20,299.50 280.28,304.49 283.36,308.90 286.44,312.72 289.52,315.93 292.60,318.53 295.69,320.60 298.77,322.22 301.85,323.47 304.93,324.45 308.01,325.29 311.09,326.27 314.17,327.69 317.25,329.80 320.33,332.82 323.41,336.77 326.49,341.47 329.57,346.71 332.66,352.30 335.74,358.06 338.82,363.67 341.90,368.81 344.98,373.15 348.06,376.41 351.14,378.45 354.22,379.52 357.30,379.97 360.38,380.15 363.46,380.37 366.54,380.82 369.62,381.41 372.71,382.03 375.79,382.56 378.87,382.91 381.95,383.19 385.03,383.80 388.11,385.10 391.19,387.43 394.27,391.03 397.35,395.71 400.43,400.99 403.51,406.44 406.59,411.65 409.68,416.30 412.76,420.38 415.84,423.94 418.92,427.06 422.00,429.81 425.08,432.23 428.16,434.20 431.24,435.62 434.32,436.38 437.40,436.40 440.48,435.68 443.56,434.37 446.64,432.57 449.73,430.42 452.81,428.00 455.89,425.39 458.97,422.60 462.05,419.66 465.13,416.57 468.21,413.35 471.29,410.10 474.37,406.88 477.45,403.78 480.53,400.87 483.61,398.17 486.70,395.65 489.78,393.26 492.86,390.95 495.94,388.70 499.02,386.54 502.10,384.65 505.18,383.16 508.26,382.21 511.34,381.91 514.42,382.29 517.50,383.33 520.58,385.01 523.66,387.30 526.75,390.15 529.83,393.44 532.91,397.03 535.99,400.78 539.07,404.60 542.15,408.41 545.23,412.23 548.31,416.12 551.39,420.09 554.47,424.20 557.55,428.42 560.63,432.68 563.72,436.92 566.80,441.07 569.88,445.08 572.96,448.82 576.04,452.18 579.12,455.03 582.20,457.28 585.28,458.86 588.36,459.88 591.44,460.49 594.52,460.82 597.60,460.99 600.68,461.01 603.77,460.72 606.85,459.91 609.93,458.40 613.01,456.05 616.09,452.87 619.17,449.07 622.25,444.84 625.33,440.37 628.41,435.86 631.49,431.52 634.57,427.63 637.65,424.42 640.74,422.07 643.82,420.75 646.90,420.43 649.98,421.06 653.06,422.59 656.14,424.96 659.22,428.08 662.30,431.80 665.38,436.00 668.46,440.54 671.54,445.33 674.62,450.19 677.70,454.95 680.79,459.40 683.87,463.41 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,161.33 73.87,160.84 76.95,159.85 80.03,158.64 83.11,157.47 86.19,156.59 89.27,155.97 92.35,155.34 95.43,154.37 98.51,152.80 101.59,150.38 104.68,147.25 107.76,143.74 110.84,140.16 113.92,136.80 117.00,133.93 120.08,131.67 123.16,130.11 126.24,129.32 129.32,129.34 132.40,130.13 135.48,131.43 138.56,132.99 141.65,134.56 144.73,135.92 147.81,137.03 150.89,138.06 153.97,139.16 157.05,140.49 160.13,142.18 163.21,144.29 166.29,146.77 169.37,149.62 172.45,152.79 175.53,156.26 178.61,159.97 181.70,163.88 184.78,167.93 187.86,172.09 190.94,176.28 194.02,180.41 197.10,184.36 200.18,188.03 203.26,191.35 206.34,194.38 209.42,197.36 212.50,200.53 215.58,204.10 218.67,208.24 221.75,212.93 224.83,218.00 227.91,223.30 230.99,228.69 234.07,234.03 237.15,239.29 240.23,244.44 243.31,249.46 246.39,254.35 249.47,259.15 252.55,264.00 255.63,269.02 258.72,274.36 261.80,280.13 264.88,286.18 267.96,292.13 271.04,297.61 274.12,302.28 277.20,305.86 280.28,308.45 283.36,310.38 286.44,311.97 289.52,313.50 292.60,315.22 295.69,317.20 298.77,319.42 301.85,321.89 304.93,324.59 308.01,327.51 311.09,330.63 314.17,333.94 317.25,337.42 320.33,341.07 323.41,344.90 326.49,348.93 329.57,353.19 332.66,357.70 335.74,362.48 338.82,367.35 341.90,372.07 344.98,376.40 348.06,380.13 351.14,383.08 354.22,385.17 357.30,386.33 360.38,386.54 363.46,385.75 366.54,384.14 369.62,382.23 372.71,380.58 375.79,379.69 378.87,380.01 381.95,381.56 385.03,383.92 388.11,386.67 391.19,389.42 394.27,391.83 397.35,393.90 400.43,395.83 403.51,397.81 406.59,400.02 409.68,402.61 412.76,405.48 415.84,408.50 418.92,411.55 422.00,414.50 425.08,417.24 428.16,419.73 431.24,421.90 434.32,423.72 437.40,425.14 440.48,426.14 443.56,426.68 446.64,426.74 449.73,426.28 452.81,425.30 455.89,423.96 458.97,422.47 462.05,421.04 465.13,419.84 468.21,419.01 471.29,418.44 474.37,417.97 477.45,417.44 480.53,416.72 483.61,415.70 486.70,414.34 489.78,412.62 492.86,410.54 495.94,408.09 499.02,405.48 502.10,403.11 505.18,401.36 508.26,400.59 511.34,401.05 514.42,402.58 517.50,404.79 520.58,407.29 523.66,409.73 526.75,411.84 529.83,413.62 532.91,415.11 535.99,416.39 539.07,417.54 542.15,418.61 545.23,419.67 548.31,420.79 551.39,422.03 554.47,423.41 557.55,424.91 560.63,426.40 563.72,427.76 566.80,428.88 569.88,429.67 572.96,430.17 576.04,430.44 579.12,430.59 582.20,430.68 585.28,430.76 588.36,430.69 591.44,430.30 594.52,429.43 597.60,427.95 600.68,425.89 603.77,423.53 606.85,421.21 609.93,419.22 613.01,417.84 616.09,417.17 619.17,417.20 622.25,417.89 625.33,419.20 628.41,421.05 631.49,423.25 634.57,425.57 637.65,427.76 640.74,429.62 643.82,431.02 646.90,432.06 649.98,432.90 653.06,433.67 656.14,434.53 659.22,435.52 662.30,436.59 665.38,437.65 668.46,438.62 671.54,439.43 674.62,439.98 677.70,440.19 680.79,439.97 683.87,439.26 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,97.26 73.87,96.74 76.95,95.79 80.03,94.80 83.11,94.18 86.19,94.28 89.27,95.28 92.35,97.17 95.43,99.92 98.51,103.48 101.59,107.80 104.68,112.69 107.76,117.88 110.84,123.14 113.92,128.26 117.00,133.06 120.08,137.51 123.16,141.62 126.24,145.40 129.32,148.87 132.40,152.00 135.48,154.60 138.56,156.49 141.65,157.50 144.73,157.48 147.81,156.52 150.89,154.93 153.97,153.06 157.05,151.19 160.13,149.59 163.21,148.26 166.29,147.09 169.37,145.95 172.45,144.73 175.53,143.41 178.61,142.49 181.70,142.55 184.78,144.16 187.86,147.81 190.94,153.66 194.02,161.21 197.10,169.91 200.18,179.20 203.26,188.59 206.34,197.65 209.42,206.04 212.50,213.45 215.58,219.63 218.67,224.40 221.75,227.97 224.83,230.73 227.91,233.08 230.99,235.40 234.07,237.93 237.15,240.56 240.23,243.07 243.31,245.23 246.39,246.84 249.47,247.85 252.55,248.49 255.63,249.03 258.72,249.74 261.80,250.84 264.88,252.52 267.96,254.93 271.04,258.19 274.12,262.40 277.20,267.64 280.28,273.86 283.36,280.94 286.44,288.79 289.52,297.31 292.60,306.37 295.69,315.81 298.77,325.44 301.85,335.09 304.93,344.62 308.01,353.74 311.09,361.90 314.17,368.52 317.25,373.11 320.33,375.21 323.41,374.93 326.49,372.86 329.57,369.62 332.66,365.80 335.74,361.92 338.82,358.19 341.90,354.68 344.98,351.41 348.06,348.40 351.14,345.73 354.22,343.86 357.30,343.33 360.38,344.60 363.46,348.13 366.54,353.93 369.62,361.33 372.71,369.58 375.79,377.95 378.87,385.81 381.95,392.90 385.03,399.35 388.11,405.32 391.19,410.97 394.27,416.44 397.35,421.67 400.43,426.47 403.51,430.66 406.59,434.07 409.68,436.56 412.76,437.99 415.84,438.26 418.92,437.27 422.00,434.93 425.08,431.40 428.16,427.25 431.24,423.08 434.32,419.44 437.40,416.82 440.48,415.32 443.56,414.69 446.64,414.62 449.73,414.84 452.81,415.08 455.89,415.17 458.97,414.98 462.05,414.39 465.13,413.30 468.21,411.73 471.29,409.96 474.37,408.35 477.45,407.25 480.53,406.95 483.61,407.61 486.70,409.07 489.78,411.13 492.86,413.61 495.94,416.34 499.02,419.17 502.10,421.97 505.18,424.66 508.26,427.14 511.34,429.33 514.42,431.07 517.50,432.18 520.58,432.51 523.66,431.89 526.75,430.26 529.83,427.75 532.91,424.56 535.99,420.85 539.07,416.80 542.15,412.62 545.23,408.59 548.31,404.99 551.39,402.07 554.47,400.05 557.55,398.96 560.63,398.73 563.72,399.26 566.80,400.44 569.88,402.18 572.96,404.38 576.04,406.97 579.12,409.86 582.20,413.00 585.28,416.33 588.36,419.82 591.44,423.42 594.52,427.11 597.60,430.88 600.68,434.68 603.77,438.46 606.85,442.18 609.93,445.77 613.01,449.19 616.09,452.38 619.17,455.25 622.25,457.71 625.33,459.68 628.41,461.12 631.49,462.03 634.57,462.43 637.65,462.38 640.74,461.91 643.82,461.04 646.90,459.80 649.98,458.20 653.06,456.26 656.14,453.98 659.22,451.46 662.30,448.90 665.38,446.53 668.46,444.55 671.54,443.13 674.62,442.35 677.70,442.17 680.79,442.57 683.87,443.51 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,144.35 73.87,145.13 76.95,146.59 80.03,148.19 83.11,149.39 86.19,149.70 89.27,149.02 92.35,147.64 95.43,145.88 98.51,144.06 101.59,142.46 104.68,141.21 107.76,140.37 110.84,139.99 113.92,140.09 117.00,140.65 120.08,141.51 123.16,142.47 126.24,143.33 129.32,143.93 132.40,144.12 135.48,143.83 138.56,142.99 141.65,141.54 144.73,139.46 147.81,136.97 150.89,134.58 153.97,132.78 157.05,132.02 160.13,132.65 163.21,134.57 166.29,137.39 169.37,140.74 172.45,144.27 175.53,147.74 178.61,151.42 181.70,155.67 184.78,160.88 187.86,167.36 190.94,175.13 194.02,183.51 197.10,191.78 200.18,199.25 203.26,205.32 206.34,209.77 209.42,212.78 212.50,214.56 215.58,215.34 218.67,215.35 221.75,215.05 224.83,214.99 227.91,215.69 230.99,217.60 234.07,221.02 237.15,225.76 240.23,231.47 243.31,237.82 246.39,244.50 249.47,251.19 252.55,257.58 255.63,263.35 258.72,268.24 261.80,272.04 264.88,274.90 267.96,277.36 271.04,279.92 274.12,283.10 277.20,287.28 280.28,292.42 283.36,298.23 286.44,304.41 289.52,310.66 292.60,316.77 295.69,322.62 298.77,328.18 301.85,333.42 304.93,338.33 308.01,342.87 311.09,347.03 314.17,350.76 317.25,354.06 320.33,356.89 323.41,359.22 326.49,361.00 329.57,362.18 332.66,362.73 335.74,362.63 338.82,361.97 341.90,360.95 344.98,359.74 348.06,358.50 351.14,357.37 354.22,356.55 357.30,356.23 360.38,356.58 363.46,357.74 366.54,359.73 369.62,362.34 372.71,365.34 375.79,368.50 378.87,371.64 381.95,374.74 385.03,377.95 388.11,381.44 391.19,385.36 394.27,389.86 397.35,394.89 400.43,400.33 403.51,406.08 406.59,412.01 409.68,417.98 412.76,423.70 415.84,428.83 418.92,433.09 422.00,436.20 425.08,438.10 428.16,439.02 431.24,439.24 434.32,439.03 437.40,438.63 440.48,438.09 443.56,437.28 446.64,436.06 449.73,434.29 452.81,431.85 455.89,428.78 458.97,425.18 462.05,421.15 465.13,416.79 468.21,412.20 471.29,407.59 474.37,403.15 477.45,399.07 480.53,395.49 483.61,392.61 486.70,390.62 489.78,389.71 492.86,390.05 495.94,391.76 499.02,394.67 502.10,398.27 505.18,402.10 508.26,405.72 511.34,408.74 514.42,411.13 517.50,412.99 520.58,414.45 523.66,415.62 526.75,416.62 529.83,417.47 532.91,418.17 535.99,418.73 539.07,419.15 542.15,419.43 545.23,419.63 548.31,419.81 551.39,420.00 554.47,420.25 557.55,420.58 560.63,421.00 563.72,421.52 566.80,422.15 569.88,422.87 572.96,423.65 576.04,424.43 579.12,425.13 582.20,425.70 585.28,426.10 588.36,426.32 591.44,426.35 594.52,426.20 597.60,425.86 600.68,425.41 603.77,425.04 606.85,424.94 609.93,425.30 613.01,426.26 616.09,427.73 619.17,429.42 622.25,431.02 625.33,432.26 628.41,432.90 631.49,432.98 634.57,432.69 637.65,432.18 640.74,431.61 643.82,431.08 646.90,430.42 649.98,429.42 653.06,427.90 656.14,425.66 659.22,422.76 662.30,419.63 665.38,416.74 668.46,414.51 671.54,413.32 674.62,413.15 677.70,413.63 680.79,414.41 683.87,415.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,156.14 73.87,154.91 76.95,152.46 80.03,149.51 83.11,146.77 86.19,144.90 89.27,144.18 92.35,144.50 95.43,145.70 98.51,147.61 101.59,150.07 104.68,152.84 107.76,155.65 110.84,158.25 113.92,160.43 117.00,162.00 120.08,162.84 123.16,162.84 126.24,161.91 129.32,159.99 132.40,157.16 135.48,153.79 138.56,150.28 141.65,146.99 144.73,144.27 147.81,142.27 150.89,141.01 153.97,140.49 157.05,140.67 160.13,141.53 163.21,143.16 166.29,145.67 169.37,149.19 172.45,153.84 175.53,159.60 178.61,166.03 181.70,172.57 184.78,178.69 187.86,183.94 190.94,188.03 194.02,191.03 197.10,193.07 200.18,194.30 203.26,194.86 206.34,194.98 209.42,195.01 212.50,195.27 215.58,196.05 218.67,197.58 221.75,200.02 224.83,203.43 227.91,207.86 230.99,213.35 234.07,219.86 237.15,227.04 240.23,234.48 243.31,241.81 246.39,248.67 249.47,254.87 252.55,260.46 255.63,265.51 258.72,270.13 261.80,274.41 264.88,278.48 267.96,282.49 271.04,286.59 274.12,290.90 277.20,295.52 280.28,300.46 283.36,305.67 286.44,311.08 289.52,316.65 292.60,322.30 295.69,327.83 298.77,333.03 301.85,337.71 304.93,341.68 308.01,344.86 311.09,347.30 314.17,349.08 317.25,350.27 320.33,350.94 323.41,351.20 326.49,351.13 329.57,350.85 332.66,350.43 335.74,349.96 338.82,349.62 341.90,349.62 344.98,350.17 348.06,351.43 351.14,353.53 354.22,356.44 357.30,360.10 360.38,364.44 363.46,369.38 366.54,374.77 369.62,380.34 372.71,385.80 375.79,390.89 378.87,395.39 381.95,399.19 385.03,402.32 388.11,404.82 391.19,406.74 394.27,408.12 397.35,409.00 400.43,409.38 403.51,409.26 406.59,408.67 409.68,407.63 412.76,406.26 415.84,404.71 418.92,403.10 422.00,401.55 425.08,400.23 428.16,399.43 431.24,399.43 434.32,400.46 437.40,402.74 440.48,406.07 443.56,409.88 446.64,413.63 449.73,416.79 452.81,418.93 455.89,420.09 458.97,420.52 462.05,420.51 465.13,420.32 468.21,420.17 471.29,420.22 474.37,420.59 477.45,421.37 480.53,422.65 483.61,424.33 486.70,426.00 489.78,427.25 492.86,427.68 495.94,426.94 499.02,425.02 502.10,422.17 505.18,418.69 508.26,414.84 511.34,410.89 514.42,407.13 517.50,403.85 520.58,401.28 523.66,399.66 526.75,399.10 529.83,399.41 532.91,400.31 535.99,401.55 539.07,402.86 542.15,404.13 545.23,405.39 548.31,406.73 551.39,408.20 554.47,409.90 557.55,411.85 560.63,414.05 563.72,416.50 566.80,419.18 569.88,422.09 572.96,425.16 576.04,428.32 579.12,431.51 582.20,434.64 585.28,437.68 588.36,440.55 591.44,443.20 594.52,445.60 597.60,447.69 600.68,449.47 603.77,451.02 606.85,452.39 609.93,453.66 613.01,454.87 616.09,455.95 619.17,456.69 622.25,456.89 625.33,456.39 628.41,455.03 631.49,452.95 634.57,450.37 637.65,447.54 640.74,444.66 643.82,441.90 646.90,439.30 649.98,436.89 653.06,434.65 656.14,432.59 659.22,430.66 662.30,428.78 665.38,426.89 668.46,424.89 671.54,422.73 674.62,420.33 677.70,417.62 680.79,414.54 683.87,411.02 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,46.53 73.87,47.89 76.95,50.90 80.03,55.14 83.11,60.21 86.19,65.67 89.27,71.19 92.35,76.51 95.43,81.40 98.51,85.68 101.59,89.23 104.68,92.34 107.76,95.54 110.84,99.35 113.92,104.23 117.00,110.46 120.08,117.64 123.16,125.19 126.24,132.55 129.32,139.21 132.40,144.81 135.48,149.25 138.56,152.49 141.65,154.54 144.73,155.40 147.81,155.30 150.89,154.70 153.97,154.06 157.05,153.78 160.13,154.21 163.21,155.40 166.29,157.23 169.37,159.57 172.45,162.29 175.53,165.27 178.61,168.48 181.70,171.89 184.78,175.50 187.86,179.30 190.94,183.25 194.02,187.31 197.10,191.38 200.18,195.42 203.26,199.37 206.34,203.14 209.42,206.64 212.50,209.76 215.58,212.42 218.67,214.55 221.75,216.31 224.83,217.91 227.91,219.60 230.99,221.58 234.07,223.97 237.15,226.60 240.23,229.24 243.31,231.65 246.39,233.62 249.47,235.12 252.55,236.48 255.63,238.10 258.72,240.32 261.80,243.47 264.88,247.68 267.96,252.93 271.04,259.18 274.12,266.38 277.20,274.44 280.28,283.11 283.36,292.04 286.44,300.89 289.52,309.39 292.60,317.31 295.69,324.70 298.77,331.67 301.85,338.34 304.93,344.83 308.01,351.15 311.09,357.06 314.17,362.34 317.25,366.77 320.33,370.16 323.41,372.43 326.49,373.67 329.57,373.97 332.66,373.40 335.74,372.08 338.82,370.21 341.90,368.09 344.98,365.98 348.06,364.11 351.14,362.70 354.22,361.97 357.30,362.12 360.38,363.31 363.46,365.70 366.54,369.26 369.62,373.64 372.71,378.48 375.79,383.43 378.87,388.18 381.95,392.57 385.03,396.62 388.11,400.35 391.19,403.82 394.27,407.06 397.35,410.07 400.43,412.85 403.51,415.40 406.59,417.70 409.68,419.76 412.76,421.64 415.84,423.41 418.92,425.11 422.00,426.80 425.08,428.47 428.16,429.98 431.24,431.16 434.32,431.89 437.40,432.03 440.48,431.57 443.56,430.63 446.64,429.31 449.73,427.72 452.81,425.96 455.89,424.06 458.97,422.06 462.05,419.96 465.13,417.78 468.21,415.48 471.29,412.94 474.37,410.00 477.45,406.51 480.53,402.34 483.61,397.51 486.70,392.27 489.78,386.91 492.86,381.71 495.94,376.90 499.02,372.71 502.10,369.35 505.18,366.97 508.26,365.75 511.34,365.77 514.42,366.99 517.50,369.28 520.58,372.49 523.66,376.51 526.75,381.17 529.83,386.18 532.91,391.24 535.99,396.05 539.07,400.38 542.15,404.12 545.23,407.42 548.31,410.46 551.39,413.41 554.47,416.43 557.55,419.60 560.63,422.94 563.72,426.45 566.80,430.13 569.88,433.95 572.96,437.75 576.04,441.29 579.12,444.35 582.20,446.74 585.28,448.35 588.36,449.32 591.44,449.85 594.52,450.13 597.60,450.36 600.68,450.68 603.77,451.18 606.85,451.93 609.93,453.01 613.01,454.46 616.09,456.16 619.17,457.84 622.25,459.27 625.33,460.19 628.41,460.44 631.49,460.03 634.57,459.12 637.65,457.83 640.74,456.32 643.82,454.70 646.90,453.18 649.98,451.91 653.06,451.05 656.14,450.74 659.22,450.98 662.30,451.57 665.38,452.30 668.46,452.96 671.54,453.37 674.62,453.45 677.70,453.21 680.79,452.67 683.87,451.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,101.28 73.87,101.27 76.95,101.34 80.03,101.65 83.11,102.31 86.19,103.46 89.27,105.17 92.35,107.50 95.43,110.51 98.51,114.23 101.59,118.67 104.68,123.56 107.76,128.49 110.84,133.08 113.92,136.97 117.00,139.91 120.08,141.94 123.16,143.20 126.24,143.84 129.32,143.99 132.40,143.79 135.48,143.35 138.56,142.79 141.65,142.19 144.73,141.64 147.81,141.27 150.89,141.23 153.97,141.67 157.05,142.74 160.13,144.52 163.21,146.85 166.29,149.42 169.37,151.95 172.45,154.16 175.53,155.89 178.61,157.22 181.70,158.34 184.78,159.42 187.86,160.65 190.94,162.19 194.02,164.25 197.10,167.03 200.18,170.70 203.26,175.40 206.34,181.07 209.42,187.44 212.50,194.23 215.58,201.20 218.67,208.10 221.75,214.80 224.83,221.19 227.91,227.17 230.99,232.68 234.07,237.71 237.15,242.44 240.23,247.07 243.31,251.82 246.39,256.88 249.47,262.31 252.55,267.90 255.63,273.42 258.72,278.65 261.80,283.40 264.88,287.52 267.96,290.97 271.04,293.70 274.12,295.67 277.20,296.91 280.28,297.78 283.36,298.79 286.44,300.46 289.52,303.24 292.60,307.40 295.69,312.59 298.77,318.31 301.85,324.09 304.93,329.47 308.01,334.12 311.09,337.91 314.17,340.76 317.25,342.62 320.33,343.46 323.41,343.47 326.49,343.07 329.57,342.67 332.66,342.65 335.74,343.32 338.82,344.66 341.90,346.46 344.98,348.54 348.06,350.70 351.14,352.84 354.22,355.21 357.30,358.15 360.38,361.97 363.46,366.97 366.54,373.19 369.62,380.18 372.71,387.46 375.79,394.60 378.87,401.17 381.95,406.98 385.03,412.06 388.11,416.45 391.19,420.20 394.27,423.37 397.35,425.90 400.43,427.69 403.51,428.63 406.59,428.64 409.68,427.71 412.76,426.13 415.84,424.25 418.92,422.40 422.00,420.89 425.08,419.88 428.16,419.31 431.24,419.09 434.32,419.12 437.40,419.29 440.48,419.51 443.56,419.67 446.64,419.67 449.73,419.44 452.81,418.91 455.89,418.24 458.97,417.69 462.05,417.48 465.13,417.83 468.21,418.81 471.29,419.95 474.37,420.68 477.45,420.46 480.53,418.79 483.61,415.55 486.70,411.25 489.78,406.48 492.86,401.81 495.94,397.73 499.02,394.53 502.10,392.27 505.18,390.97 508.26,390.63 511.34,391.23 514.42,392.70 517.50,394.92 520.58,397.77 523.66,401.16 526.75,404.96 529.83,408.94 532.91,412.88 535.99,416.56 539.07,419.80 542.15,422.45 545.23,424.47 548.31,425.82 551.39,426.49 554.47,426.46 557.55,425.87 560.63,424.99 563.72,424.08 566.80,423.37 569.88,423.06 572.96,423.20 576.04,423.75 579.12,424.70 582.20,425.98 585.28,427.56 588.36,429.42 591.44,431.53 594.52,433.88 597.60,436.43 600.68,439.10 603.77,441.63 606.85,443.79 609.93,445.36 613.01,446.13 616.09,446.18 619.17,445.76 622.25,445.14 625.33,444.58 628.41,444.28 631.49,444.18 634.57,444.10 637.65,443.85 640.74,443.27 643.82,442.28 646.90,441.08 649.98,439.97 653.06,439.19 656.14,439.01 659.22,439.51 662.30,440.61 665.38,442.18 668.46,444.08 671.54,446.20 674.62,448.42 677.70,450.63 680.79,452.73 683.87,454.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,80.77 73.87,80.42 76.95,79.96 80.03,79.88 83.11,80.63 86.19,82.62 89.27,85.99 92.35,90.51 95.43,95.97 98.51,102.14 101.59,108.81 104.68,115.67 107.76,122.37 110.84,128.59 113.92,134.08 117.00,138.62 120.08,142.27 123.16,145.13 126.24,147.35 129.32,149.04 132.40,150.31 135.48,151.28 138.56,152.03 141.65,152.67 144.73,153.25 147.81,153.74 150.89,153.95 153.97,153.72 157.05,152.88 160.13,151.34 163.21,149.43 166.29,147.72 169.37,146.74 172.45,146.98 175.53,148.77 178.61,151.87 181.70,155.91 184.78,160.49 187.86,165.26 190.94,169.99 194.02,174.68 197.10,179.35 200.18,184.06 203.26,188.85 206.34,193.58 209.42,197.95 212.50,201.63 215.58,204.35 218.67,205.90 221.75,206.66 224.83,207.27 227.91,208.36 230.99,210.51 234.07,214.10 237.15,218.96 240.23,224.73 243.31,231.06 246.39,237.62 249.47,244.18 252.55,250.69 255.63,257.14 258.72,263.54 261.80,269.89 264.88,276.20 267.96,282.44 271.04,288.62 274.12,294.72 277.20,300.73 280.28,306.64 283.36,312.46 286.44,318.19 289.52,323.83 292.60,329.34 295.69,334.51 298.77,339.11 301.85,342.93 304.93,345.75 308.01,347.62 311.09,348.99 314.17,350.36 317.25,352.20 320.33,354.92 323.41,358.50 326.49,362.53 329.57,366.55 332.66,370.15 335.74,372.95 338.82,374.83 341.90,375.80 344.98,375.87 348.06,375.07 351.14,373.49 354.22,371.40 357.30,369.11 360.38,366.90 363.46,365.04 366.54,363.77 369.62,363.34 372.71,363.99 375.79,365.92 378.87,369.29 381.95,373.96 385.03,379.54 388.11,385.62 391.19,391.83 394.27,397.84 397.35,403.53 400.43,408.85 403.51,413.82 406.59,418.44 409.68,422.69 412.76,426.44 415.84,429.55 418.92,431.87 422.00,433.29 425.08,433.82 428.16,433.76 431.24,433.39 434.32,433.02 437.40,432.88 440.48,433.02 443.56,433.26 446.64,433.42 449.73,433.30 452.81,432.75 455.89,431.52 458.97,429.35 462.05,426.01 465.13,421.27 468.21,415.13 471.29,408.14 474.37,401.00 477.45,394.38 480.53,388.88 483.61,384.86 486.70,382.27 489.78,381.00 492.86,380.93 495.94,381.91 499.02,383.72 502.10,386.05 505.18,388.59 508.26,391.08 511.34,393.30 514.42,395.13 517.50,396.50 520.58,397.40 523.66,397.79 526.75,397.73 529.83,397.53 532.91,397.55 535.99,398.12 539.07,399.55 542.15,401.94 545.23,405.04 548.31,408.60 551.39,412.33 554.47,416.00 557.55,419.45 560.63,422.59 563.72,425.36 566.80,427.71 569.88,429.61 572.96,431.19 576.04,432.62 579.12,434.08 582.20,435.72 585.28,437.63 588.36,439.68 591.44,441.69 594.52,443.48 597.60,444.89 600.68,445.78 603.77,446.06 606.85,445.66 609.93,444.49 613.01,442.53 616.09,439.89 619.17,436.81 622.25,433.56 625.33,430.37 628.41,427.45 631.49,425.03 634.57,423.34 637.65,422.55 640.74,422.85 643.82,424.30 646.90,426.73 649.98,429.91 653.06,433.60 656.14,437.61 659.22,441.75 662.30,445.92 665.38,450.01 668.46,453.97 671.54,457.71 674.62,461.25 677.70,464.64 680.79,467.94 683.87,471.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,93.85 73.87,93.66 76.95,93.46 80.03,93.55 83.11,94.24 86.19,95.79 89.27,98.27 92.35,101.58 95.43,105.57 98.51,110.13 101.59,115.11 104.68,120.30 107.76,125.45 110.84,130.30 113.92,134.67 117.00,138.38 120.08,141.43 123.16,143.87 126.24,145.75 129.32,147.12 132.40,148.04 135.48,148.63 138.56,149.00 141.65,149.24 144.73,149.44 147.81,149.61 150.89,149.71 153.97,149.69 157.05,149.49 160.13,149.08 163.21,148.66 166.29,148.50 169.37,148.89 172.45,150.08 175.53,152.26 178.61,155.42 181.70,159.52 184.78,164.48 187.86,170.25 190.94,176.63 194.02,183.20 197.10,189.54 200.18,195.24 203.26,199.96 206.34,203.60 209.42,206.25 212.50,208.07 215.58,209.19 218.67,209.77 221.75,210.17 224.83,210.85 227.91,212.25 230.99,214.73 234.07,218.50 237.15,223.15 240.23,228.13 243.31,232.88 246.39,236.91 249.47,240.04 252.55,242.64 255.63,245.17 258.72,248.08 261.80,251.76 264.88,256.31 267.96,261.57 271.04,267.32 274.12,273.36 277.20,279.54 280.28,285.93 283.36,292.71 286.44,300.08 289.52,308.21 292.60,317.16 295.69,326.48 298.77,335.59 301.85,343.96 304.93,351.13 308.01,356.78 311.09,360.93 314.17,363.67 317.25,365.09 320.33,365.28 323.41,364.59 326.49,363.61 329.57,362.89 332.66,362.94 335.74,364.15 338.82,366.40 341.90,369.29 344.98,372.40 348.06,375.37 351.14,377.87 354.22,379.89 357.30,381.47 360.38,382.66 363.46,383.52 366.54,384.12 369.62,384.51 372.71,384.76 375.79,384.92 378.87,385.04 381.95,385.24 385.03,385.75 388.11,386.76 391.19,388.43 394.27,390.93 397.35,394.15 400.43,397.91 403.51,402.04 406.59,406.35 409.68,410.68 412.76,414.83 415.84,418.61 418.92,421.85 422.00,424.41 425.08,426.25 428.16,427.47 431.24,428.23 434.32,428.65 437.40,428.86 440.48,428.76 443.56,428.08 446.64,426.52 449.73,423.82 452.81,419.82 455.89,414.93 458.97,409.84 462.05,405.21 465.13,401.67 468.21,399.63 471.29,398.91 474.37,399.18 477.45,400.11 480.53,401.37 483.61,402.75 486.70,404.17 489.78,405.61 492.86,407.04 495.94,408.44 499.02,409.79 502.10,410.99 505.18,412.00 508.26,412.74 511.34,413.18 514.42,413.41 517.50,413.59 520.58,413.85 523.66,414.33 526.75,415.11 529.83,416.09 532.91,417.15 535.99,418.14 539.07,418.95 542.15,419.51 545.23,419.82 548.31,419.89 551.39,419.76 554.47,419.45 557.55,419.08 560.63,418.87 563.72,419.03 566.80,419.74 569.88,421.15 572.96,423.06 576.04,425.18 579.12,427.20 582.20,428.82 585.28,429.89 588.36,430.52 591.44,430.91 594.52,431.26 597.60,431.75 600.68,432.53 603.77,433.66 606.85,435.21 609.93,437.22 613.01,439.71 616.09,442.48 619.17,445.11 622.25,447.24 625.33,448.49 628.41,448.60 631.49,447.67 634.57,446.03 637.65,443.97 640.74,441.77 643.82,439.65 646.90,437.53 649.98,435.30 653.06,432.84 656.14,430.02 659.22,426.78 662.30,423.16 665.38,419.20 668.46,414.94 671.54,410.44 674.62,405.73 677.70,400.91 680.79,396.02 683.87,391.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,151.17 73.87,150.94 76.95,150.50 80.03,149.98 83.11,149.52 86.19,149.25 89.27,149.24 92.35,149.55 95.43,150.18 98.51,151.16 101.59,152.49 104.68,154.13 107.76,156.00 110.84,158.02 113.92,160.13 117.00,162.23 120.08,163.99 123.16,165.08 126.24,165.17 129.32,163.99 132.40,161.52 135.48,158.31 138.56,154.96 141.65,152.02 144.73,149.99 147.81,148.97 150.89,148.66 153.97,148.72 157.05,148.81 160.13,148.68 163.21,148.44 166.29,148.44 169.37,149.02 172.45,150.49 175.53,153.03 178.61,156.40 181.70,160.19 184.78,164.06 187.86,167.66 190.94,170.78 194.02,173.39 197.10,175.55 200.18,177.28 203.26,178.63 206.34,179.75 209.42,180.86 212.50,182.19 215.58,183.93 218.67,186.26 221.75,189.40 224.83,193.57 227.91,198.97 230.99,205.76 234.07,213.99 237.15,223.18 240.23,232.77 243.31,242.19 246.39,250.97 249.47,258.78 252.55,265.64 255.63,271.61 258.72,276.77 261.80,281.22 264.88,285.07 267.96,288.47 271.04,291.53 274.12,294.38 277.20,297.13 280.28,299.98 283.36,303.14 286.44,306.82 289.52,311.21 292.60,316.33 295.69,321.75 298.77,326.89 301.85,331.22 304.93,334.24 308.01,335.77 311.09,336.13 314.17,335.74 317.25,334.97 320.33,334.19 323.41,333.67 326.49,333.58 329.57,334.05 332.66,335.22 335.74,337.15 338.82,339.86 341.90,343.28 344.98,347.37 348.06,352.05 351.14,357.25 354.22,362.77 357.30,368.40 360.38,373.95 363.46,379.23 366.54,384.11 369.62,388.50 372.71,392.32 375.79,395.51 378.87,398.03 381.95,400.09 385.03,402.17 388.11,404.71 391.19,408.11 394.27,412.71 397.35,418.28 400.43,424.33 403.51,430.40 406.59,436.03 409.68,440.85 412.76,444.69 415.84,447.44 418.92,449.02 422.00,449.36 425.08,448.51 428.16,446.70 431.24,444.20 434.32,441.23 437.40,438.00 440.48,434.68 443.56,431.34 446.64,428.04 449.73,424.85 452.81,421.80 455.89,418.86 458.97,416.00 462.05,413.17 465.13,410.33 468.21,407.46 471.29,404.69 474.37,402.15 477.45,400.00 480.53,398.34 483.61,397.20 486.70,396.41 489.78,395.78 492.86,395.13 495.94,394.30 499.02,393.28 502.10,392.16 505.18,391.07 508.26,390.11 511.34,389.40 514.42,389.05 517.50,389.20 520.58,389.97 523.66,391.47 526.75,393.75 529.83,396.73 532.91,400.27 535.99,404.28 539.07,408.62 542.15,413.13 545.23,417.53 548.31,421.51 551.39,424.84 554.47,427.28 557.55,428.87 560.63,429.85 563.72,430.47 566.80,430.99 569.88,431.59 572.96,432.37 576.04,433.32 579.12,434.44 582.20,435.72 585.28,437.12 588.36,438.58 591.44,440.02 594.52,441.37 597.60,442.57 600.68,443.61 603.77,444.59 606.85,445.58 609.93,446.69 613.01,447.98 616.09,449.42 619.17,450.84 622.25,452.10 625.33,453.05 628.41,453.57 631.49,453.56 634.57,452.98 637.65,451.78 640.74,449.92 643.82,447.43 646.90,444.45 649.98,441.18 653.06,437.79 656.14,434.45 659.22,431.28 662.30,428.36 665.38,425.77 668.46,423.57 671.54,421.78 674.62,420.32 677.70,419.01 680.79,417.67 683.87,416.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,119.25 73.87,119.26 76.95,119.26 80.03,119.18 83.11,118.98 86.19,118.62 89.27,118.24 92.35,118.18 95.43,118.76 98.51,120.27 101.59,122.94 104.68,126.53 107.76,130.57 110.84,134.58 113.92,138.15 117.00,140.93 120.08,142.86 123.16,144.01 126.24,144.42 129.32,144.16 132.40,143.35 135.48,142.17 138.56,140.83 141.65,139.49 144.73,138.30 147.81,137.42 150.89,136.98 153.97,137.08 157.05,137.83 160.13,139.29 163.21,141.40 166.29,144.03 169.37,147.03 172.45,150.29 175.53,153.71 178.61,157.29 181.70,161.05 184.78,165.04 187.86,169.29 190.94,173.74 194.02,178.22 197.10,182.51 200.18,186.43 203.26,189.82 206.34,192.73 209.42,195.45 212.50,198.26 215.58,201.44 218.67,205.22 221.75,209.70 224.83,214.92 227.91,220.90 230.99,227.64 234.07,235.07 237.15,242.82 240.23,250.44 243.31,257.51 246.39,263.66 249.47,268.68 252.55,272.58 255.63,275.46 258.72,277.38 261.80,278.46 264.88,278.91 267.96,279.08 271.04,279.31 274.12,279.91 277.20,281.13 280.28,283.14 283.36,286.03 286.44,289.87 289.52,294.72 292.60,300.60 295.69,307.39 298.77,314.98 301.85,323.24 304.93,332.06 308.01,341.15 311.09,349.90 314.17,357.70 317.25,363.97 320.33,368.22 323.41,370.40 326.49,370.85 329.57,369.96 332.66,368.09 335.74,365.60 338.82,362.93 341.90,360.56 344.98,358.90 348.06,358.35 351.14,359.14 354.22,361.13 357.30,364.06 360.38,367.69 363.46,371.78 366.54,376.08 369.62,380.28 372.71,384.12 375.79,387.35 378.87,389.77 381.95,391.43 385.03,392.66 388.11,393.76 391.19,395.05 394.27,396.78 397.35,399.01 400.43,401.72 403.51,404.85 406.59,408.36 409.68,412.17 412.76,416.13 415.84,420.06 418.92,423.80 422.00,427.22 425.08,430.16 428.16,432.40 431.24,433.76 434.32,434.06 437.40,433.15 440.48,431.19 443.56,428.57 446.64,425.71 449.73,422.97 452.81,420.68 455.89,418.84 458.97,417.32 462.05,415.98 465.13,414.68 468.21,413.29 471.29,411.64 474.37,409.63 477.45,407.12 480.53,404.02 483.61,400.41 486.70,396.71 489.78,393.36 492.86,390.75 495.94,389.25 499.02,388.92 502.10,389.57 505.18,390.98 508.26,392.94 511.34,395.26 514.42,397.81 517.50,400.49 520.58,403.22 523.66,405.94 526.75,408.60 529.83,411.12 532.91,413.45 535.99,415.56 539.07,417.40 542.15,418.94 545.23,420.18 548.31,421.09 551.39,421.69 554.47,421.96 557.55,422.03 560.63,422.11 563.72,422.40 566.80,423.09 569.88,424.32 572.96,425.98 576.04,427.84 579.12,429.66 582.20,431.24 585.28,432.43 588.36,433.23 591.44,433.70 594.52,433.90 597.60,433.89 600.68,433.73 603.77,433.50 606.85,433.27 609.93,433.09 613.01,433.03 616.09,433.09 619.17,433.24 622.25,433.47 625.33,433.72 628.41,433.99 631.49,434.27 634.57,434.58 637.65,434.92 640.74,435.31 643.82,435.78 646.90,436.42 649.98,437.35 653.06,438.65 656.14,440.42 659.22,442.60 662.30,444.96 665.38,447.23 668.46,449.16 671.54,450.54 674.62,451.31 677.70,451.57 680.79,451.41 683.87,450.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,162.66 73.87,162.37 76.95,161.81 80.03,161.17 83.11,160.64 86.19,160.39 89.27,160.43 92.35,160.59 95.43,160.70 98.51,160.61 101.59,160.17 104.68,159.34 107.76,158.15 110.84,156.64 113.92,154.83 117.00,152.79 120.08,150.67 123.16,148.63 126.24,146.82 129.32,145.39 132.40,144.39 135.48,143.71 138.56,143.23 141.65,142.82 144.73,142.38 147.81,141.96 150.89,141.79 153.97,142.09 157.05,143.08 160.13,144.91 163.21,147.48 166.29,150.50 169.37,153.72 172.45,156.88 175.53,159.78 178.61,162.33 181.70,164.46 184.78,166.15 187.86,167.36 190.94,168.20 194.02,169.02 197.10,170.21 200.18,172.11 203.26,175.03 206.34,178.94 209.42,183.48 212.50,188.26 215.58,192.93 218.67,197.21 221.75,201.13 224.83,204.92 227.91,208.81 230.99,213.02 234.07,217.70 237.15,222.70 240.23,227.85 243.31,232.94 246.39,237.80 249.47,242.39 252.55,246.91 255.63,251.61 258.72,256.70 261.80,262.40 264.88,268.65 267.96,275.19 271.04,281.72 274.12,288.00 277.20,293.80 280.28,299.20 283.36,304.41 286.44,309.66 289.52,315.14 292.60,320.97 295.69,326.87 298.77,332.50 301.85,337.51 304.93,341.59 308.01,344.64 311.09,346.96 314.17,348.87 317.25,350.69 320.33,352.71 323.41,355.04 326.49,357.62 329.57,360.37 332.66,363.20 335.74,366.03 338.82,368.87 341.90,371.79 344.98,374.84 348.06,378.06 351.14,381.48 354.22,384.94 357.30,388.29 360.38,391.35 363.46,393.98 366.54,396.02 369.62,397.30 372.71,397.64 375.79,396.90 378.87,394.97 381.95,392.12 385.03,388.99 388.11,386.21 391.19,384.35 394.27,383.91 397.35,384.95 400.43,387.33 403.51,390.88 406.59,395.44 409.68,400.79 412.76,406.59 415.84,412.50 418.92,418.17 422.00,423.32 425.08,427.74 428.16,431.33 431.24,434.04 434.32,435.84 437.40,436.70 440.48,436.66 443.56,435.80 446.64,434.24 449.73,432.06 452.81,429.34 455.89,426.24 458.97,422.94 462.05,419.59 465.13,416.34 468.21,413.27 471.29,410.31 474.37,407.33 477.45,404.22 480.53,400.85 483.61,397.23 486.70,393.60 489.78,390.20 492.86,387.24 495.94,384.93 499.02,383.43 502.10,382.87 505.18,383.33 508.26,384.91 511.34,387.62 514.42,391.18 517.50,395.15 520.58,399.12 523.66,402.70 526.75,405.62 529.83,407.91 532.91,409.68 535.99,411.04 539.07,412.12 542.15,413.02 545.23,413.85 548.31,414.70 551.39,415.63 554.47,416.73 557.55,418.02 560.63,419.50 563.72,421.16 566.80,422.98 569.88,424.96 572.96,427.07 576.04,429.27 579.12,431.56 582.20,433.90 585.28,436.27 588.36,438.69 591.44,441.16 594.52,443.69 597.60,446.29 600.68,448.87 603.77,451.20 606.85,453.03 609.93,454.14 613.01,454.33 616.09,453.61 619.17,452.11 622.25,450.01 625.33,447.45 628.41,444.62 631.49,441.83 634.57,439.43 637.65,437.78 640.74,437.18 643.82,437.77 646.90,439.21 649.98,441.10 653.06,443.02 656.14,444.58 659.22,445.59 662.30,446.08 665.38,446.13 668.46,445.84 671.54,445.31 674.62,444.66 677.70,444.06 680.79,443.67 683.87,443.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,150.65 73.87,151.46 76.95,153.17 80.03,155.44 83.11,157.93 86.19,160.30 89.27,162.31 92.35,163.78 95.43,164.59 98.51,164.62 101.59,163.78 104.68,162.14 107.76,159.84 110.84,157.04 113.92,153.87 117.00,150.46 120.08,146.99 123.16,143.65 126.24,140.60 129.32,137.96 132.40,135.89 135.48,134.51 138.56,133.96 141.65,134.36 144.73,135.77 147.81,138.04 150.89,140.70 153.97,143.31 157.05,145.45 160.13,146.82 163.21,147.53 166.29,147.97 169.37,148.54 172.45,149.59 175.53,151.39 178.61,153.96 181.70,157.22 184.78,161.08 187.86,165.45 190.94,170.18 194.02,174.91 197.10,179.31 200.18,183.07 203.26,185.91 206.34,187.89 209.42,189.38 212.50,190.78 215.58,192.44 218.67,194.67 221.75,197.50 224.83,200.83 227.91,204.53 230.99,208.47 234.07,212.61 237.15,217.13 240.23,222.31 243.31,228.39 246.39,235.58 249.47,243.93 252.55,253.08 255.63,262.67 258.72,272.33 261.80,281.75 264.88,290.63 267.96,298.75 271.04,305.90 274.12,311.90 277.20,316.63 280.28,320.20 283.36,322.86 286.44,324.86 289.52,326.43 292.60,327.78 295.69,329.20 298.77,330.97 301.85,333.34 304.93,336.51 308.01,340.48 311.09,344.82 314.17,349.07 317.25,352.79 320.33,355.60 323.41,357.48 326.49,358.82 329.57,359.99 332.66,361.37 335.74,363.24 338.82,365.44 341.90,367.58 344.98,369.27 348.06,370.14 351.14,369.95 354.22,368.90 357.30,367.31 360.38,365.47 363.46,363.67 366.54,362.11 369.62,360.91 372.71,360.14 375.79,359.84 378.87,360.09 381.95,361.04 385.03,363.00 388.11,366.26 391.19,371.07 394.27,377.60 397.35,385.53 400.43,394.31 403.51,403.41 406.59,412.33 409.68,420.65 412.76,428.06 415.84,434.34 418.92,439.30 422.00,442.76 425.08,444.69 428.16,445.22 431.24,444.53 434.32,442.77 437.40,440.10 440.48,436.82 443.56,433.33 446.64,430.02 449.73,427.23 452.81,425.23 455.89,423.81 458.97,422.53 462.05,420.98 465.13,418.74 468.21,415.59 471.29,411.77 474.37,407.67 477.45,403.65 480.53,400.05 483.61,397.08 486.70,394.69 489.78,392.78 492.86,391.28 495.94,390.08 499.02,389.15 502.10,388.46 505.18,388.01 508.26,387.81 511.34,387.84 514.42,388.15 517.50,388.83 520.58,389.91 523.66,391.48 526.75,393.56 529.83,396.15 532.91,399.25 535.99,402.82 539.07,406.87 542.15,411.28 545.23,415.81 548.31,420.21 551.39,424.26 554.47,427.76 557.55,430.76 560.63,433.52 563.72,436.30 566.80,439.35 569.88,442.86 572.96,446.73 576.04,450.71 579.12,454.57 582.20,458.08 585.28,461.05 588.36,463.36 591.44,464.92 594.52,465.66 597.60,465.53 600.68,464.58 603.77,463.05 606.85,461.20 609.93,459.25 613.01,457.42 616.09,455.83 619.17,454.52 622.25,453.50 625.33,452.78 628.41,452.36 631.49,452.10 634.57,451.81 637.65,451.32 640.74,450.48 643.82,449.15 646.90,447.29 649.98,444.88 653.06,441.90 656.14,438.36 659.22,434.26 662.30,429.64 665.38,424.56 668.46,419.05 671.54,413.17 674.62,407.14 677.70,401.35 680.79,396.15 683.87,391.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,92.14 73.87,92.38 76.95,92.90 80.03,93.63 83.11,94.50 86.19,95.44 89.27,96.58 92.35,98.20 95.43,100.63 98.51,104.13 101.59,108.90 104.68,114.63 107.76,120.72 110.84,126.60 113.92,131.73 117.00,135.73 120.08,138.64 123.16,140.65 126.24,141.96 129.32,142.75 132.40,143.18 135.48,143.35 138.56,143.36 141.65,143.28 144.73,143.16 147.81,143.11 150.89,143.26 153.97,143.73 157.05,144.63 160.13,146.06 163.21,148.04 166.29,150.57 169.37,153.62 172.45,157.17 175.53,161.21 178.61,165.73 181.70,170.72 184.78,176.17 187.86,182.07 190.94,188.28 194.02,194.36 197.10,199.88 200.18,204.42 203.26,207.62 206.34,209.48 209.42,210.30 212.50,210.43 215.58,210.18 218.67,209.86 221.75,209.76 224.83,210.15 227.91,211.28 230.99,213.36 234.07,216.50 237.15,220.45 240.23,224.86 243.31,229.42 246.39,233.82 249.47,237.96 252.55,242.12 255.63,246.60 258.72,251.71 261.80,257.71 264.88,264.58 267.96,272.03 271.04,279.72 274.12,287.38 277.20,294.72 280.28,301.60 283.36,307.90 286.44,313.54 289.52,318.46 292.60,322.65 295.69,326.30 298.77,329.67 301.85,332.97 304.93,336.43 308.01,340.14 311.09,343.99 314.17,347.84 317.25,351.57 320.33,355.04 323.41,358.21 326.49,361.11 329.57,363.78 332.66,366.25 335.74,368.56 338.82,370.68 341.90,372.53 344.98,374.06 348.06,375.21 351.14,375.97 354.22,376.44 357.30,376.79 360.38,377.15 363.46,377.66 366.54,378.37 369.62,379.28 372.71,380.33 375.79,381.49 378.87,382.71 381.95,383.96 385.03,385.23 388.11,386.51 391.19,387.80 394.27,389.08 397.35,390.43 400.43,391.95 403.51,393.74 406.59,395.89 409.68,398.50 412.76,401.70 415.84,405.65 418.92,410.47 422.00,416.28 425.08,422.89 428.16,429.61 431.24,435.69 434.32,440.45 437.40,443.28 440.48,444.07 443.56,443.14 446.64,440.87 449.73,437.61 452.81,433.71 455.89,429.45 458.97,425.08 462.05,420.83 465.13,416.88 468.21,413.38 471.29,410.39 474.37,407.91 477.45,405.95 480.53,404.52 483.61,403.58 486.70,403.08 489.78,402.96 492.86,403.17 495.94,403.65 499.02,404.32 502.10,405.08 505.18,405.84 508.26,406.50 511.34,407.00 514.42,407.37 517.50,407.67 520.58,407.97 523.66,408.34 526.75,408.82 529.83,409.33 532.91,409.81 535.99,410.16 539.07,410.31 542.15,410.27 545.23,410.19 548.31,410.20 551.39,410.46 554.47,411.08 557.55,412.15 560.63,413.65 563.72,415.59 566.80,417.97 569.88,420.75 572.96,423.79 576.04,426.90 579.12,429.87 582.20,432.55 585.28,434.80 588.36,436.63 591.44,438.07 594.52,439.16 597.60,439.93 600.68,440.43 603.77,440.67 606.85,440.66 609.93,440.40 613.01,439.92 616.09,439.27 619.17,438.54 622.25,437.85 625.33,437.26 628.41,436.87 631.49,436.67 634.57,436.67 637.65,436.83 640.74,437.15 643.82,437.62 646.90,438.32 649.98,439.32 653.06,440.70 656.14,442.52 659.22,444.72 662.30,447.07 665.38,449.28 668.46,451.14 671.54,452.41 674.62,453.05 677.70,453.16 680.79,452.85 683.87,452.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,49.93 73.87,50.26 76.95,51.18 80.03,52.76 83.11,55.09 86.19,58.23 89.27,62.23 92.35,67.10 95.43,72.88 98.51,79.57 101.59,87.17 104.68,95.38 107.76,103.81 110.84,112.05 113.92,119.76 117.00,126.64 120.08,132.43 123.16,136.94 126.24,139.98 129.32,141.42 132.40,141.37 135.48,140.43 138.56,139.27 141.65,138.49 144.73,138.63 147.81,139.92 150.89,142.31 153.97,145.66 157.05,149.87 160.13,154.80 163.21,160.17 166.29,165.68 169.37,171.02 172.45,175.92 175.53,180.18 178.61,183.65 181.70,186.26 184.78,187.93 187.86,188.62 190.94,188.39 194.02,187.56 197.10,186.45 200.18,185.37 203.26,184.60 206.34,184.37 209.42,184.89 212.50,186.33 215.58,188.84 218.67,192.52 221.75,197.15 224.83,202.38 227.91,207.85 230.99,213.24 234.07,218.31 237.15,223.07 240.23,227.58 243.31,231.94 246.39,236.23 249.47,240.53 252.55,244.88 255.63,249.36 258.72,253.99 261.80,258.83 264.88,263.90 267.96,269.22 271.04,274.83 274.12,280.73 277.20,286.95 280.28,293.43 283.36,300.10 286.44,306.88 289.52,313.71 292.60,320.47 295.69,326.83 298.77,332.40 301.85,336.84 304.93,339.84 308.01,341.43 311.09,342.27 314.17,343.10 317.25,344.58 320.33,347.32 323.41,351.39 326.49,356.31 329.57,361.59 332.66,366.76 335.74,371.39 338.82,375.34 341.90,378.58 344.98,381.14 348.06,383.04 351.14,384.29 354.22,384.80 357.30,384.48 360.38,383.23 363.46,380.98 366.54,377.92 369.62,374.75 372.71,372.22 375.79,370.99 378.87,371.66 381.95,374.15 385.03,377.73 388.11,381.66 391.19,385.23 394.27,387.86 397.35,389.66 400.43,391.04 403.51,392.45 406.59,394.29 409.68,396.91 412.76,400.35 415.84,404.57 418.92,409.52 422.00,415.16 425.08,421.34 428.16,427.78 431.24,434.18 434.32,440.28 437.40,445.83 440.48,450.54 443.56,454.03 446.64,455.98 449.73,456.09 452.81,454.16 455.89,450.47 458.97,445.55 462.05,439.91 465.13,434.02 468.21,428.27 471.29,422.79 474.37,417.63 477.45,412.84 480.53,408.42 483.61,404.39 486.70,400.70 489.78,397.34 492.86,394.27 495.94,391.48 499.02,389.02 502.10,387.00 505.18,385.53 508.26,384.73 511.34,384.67 514.42,385.27 517.50,386.38 520.58,387.84 523.66,389.53 526.75,391.33 529.83,393.23 532.91,395.26 535.99,397.44 539.07,399.79 542.15,402.34 545.23,405.15 548.31,408.23 551.39,411.64 554.47,415.41 557.55,419.56 560.63,424.10 563.72,429.05 566.80,434.43 569.88,440.20 572.96,446.12 576.04,451.84 579.12,457.01 582.20,461.34 585.28,464.61 588.36,466.88 591.44,468.26 594.52,468.88 597.60,468.85 600.68,468.29 603.77,467.25 606.85,465.79 609.93,463.97 613.01,461.83 616.09,459.42 619.17,456.77 622.25,453.92 625.33,450.90 628.41,447.76 631.49,444.60 634.57,441.57 637.65,438.80 640.74,436.41 643.82,434.47 646.90,433.00 649.98,431.96 653.06,431.32 656.14,431.06 659.22,431.13 662.30,431.43 665.38,431.88 668.46,432.40 671.54,432.93 674.62,433.46 677.70,434.03 680.79,434.68 683.87,435.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,102.39 73.87,102.79 76.95,103.66 80.03,104.87 83.11,106.30 86.19,107.81 89.27,109.48 92.35,111.52 95.43,114.17 98.51,117.66 101.59,122.14 104.68,127.34 107.76,132.77 110.84,137.95 113.92,142.44 117.00,145.93 120.08,148.56 123.16,150.59 126.24,152.27 129.32,153.86 132.40,155.46 135.48,156.96 138.56,158.20 141.65,159.01 144.73,159.25 147.81,158.99 150.89,158.48 153.97,158.01 157.05,157.83 160.13,158.12 163.21,158.84 166.29,159.74 169.37,160.62 172.45,161.27 175.53,161.56 178.61,161.61 181.70,161.61 184.78,161.77 187.86,162.26 190.94,163.24 194.02,164.92 197.10,167.44 200.18,170.96 203.26,175.59 206.34,181.21 209.42,187.44 212.50,193.94 215.58,200.35 218.67,206.40 221.75,212.02 224.83,217.30 227.91,222.30 230.99,227.13 234.07,231.85 237.15,236.43 240.23,240.83 243.31,245.01 246.39,248.92 249.47,252.60 252.55,256.19 255.63,259.86 258.72,263.76 261.80,268.02 264.88,272.68 267.96,277.65 271.04,282.83 274.12,288.15 277.20,293.53 280.28,298.89 283.36,304.21 286.44,309.45 289.52,314.57 292.60,319.55 295.69,324.34 298.77,328.92 301.85,333.25 304.93,337.29 308.01,341.00 311.09,344.23 314.17,346.86 317.25,348.76 320.33,349.84 323.41,350.34 326.49,350.84 329.57,351.90 332.66,354.04 335.74,357.67 338.82,362.52 341.90,367.98 344.98,373.46 348.06,378.41 351.14,382.43 354.22,385.56 357.30,387.98 360.38,389.89 363.46,391.46 366.54,392.82 369.62,393.95 372.71,394.82 375.79,395.40 378.87,395.64 381.95,395.59 385.03,395.35 388.11,395.04 391.19,394.75 394.27,394.58 397.35,394.79 400.43,395.69 403.51,397.55 406.59,400.63 409.68,405.01 412.76,410.07 415.84,415.08 418.92,419.34 422.00,422.20 425.08,423.44 428.16,423.52 431.24,423.01 434.32,422.45 437.40,422.33 440.48,422.80 443.56,423.68 446.64,424.76 449.73,425.84 452.81,426.71 455.89,427.08 458.97,426.65 462.05,425.14 465.13,422.29 468.21,418.08 471.29,413.17 474.37,408.42 477.45,404.60 480.53,402.43 483.61,402.13 486.70,403.05 489.78,404.45 492.86,405.64 495.94,405.96 499.02,405.27 502.10,403.88 505.18,402.12 508.26,400.32 511.34,398.76 514.42,397.56 517.50,396.71 520.58,396.20 523.66,396.02 526.75,396.17 529.83,396.70 532.91,397.68 535.99,399.17 539.07,401.24 542.15,403.81 545.23,406.67 548.31,409.58 551.39,412.29 554.47,414.63 557.55,416.55 560.63,418.18 563.72,419.65 566.80,421.09 569.88,422.60 572.96,424.25 576.04,426.04 579.12,427.98 582.20,430.08 585.28,432.33 588.36,434.66 591.44,436.99 594.52,439.24 597.60,441.34 600.68,443.31 603.77,445.29 606.85,447.41 609.93,449.82 613.01,452.64 616.09,455.79 619.17,459.05 622.25,462.16 625.33,464.93 628.41,467.15 631.49,468.79 634.57,469.89 637.65,470.48 640.74,470.61 643.82,470.32 646.90,469.59 649.98,468.40 653.06,466.74 656.14,464.58 659.22,461.95 662.30,458.90 665.38,455.48 668.46,451.76 671.54,447.79 674.62,443.68 677.70,439.59 680.79,435.68 683.87,432.06 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,103.93 73.87,104.28 76.95,105.20 80.03,106.70 83.11,108.81 86.19,111.55 89.27,114.90 92.35,118.83 95.43,123.30 98.51,128.28 101.59,133.72 104.68,139.36 107.76,144.81 110.84,149.72 113.92,153.79 117.00,156.77 120.08,158.60 123.16,159.30 126.24,158.88 129.32,157.40 132.40,155.03 135.48,152.28 138.56,149.67 141.65,147.68 144.73,146.71 147.81,146.78 150.89,147.47 153.97,148.34 157.05,148.97 160.13,149.03 163.21,148.63 166.29,148.12 169.37,147.88 172.45,148.23 175.53,149.41 178.61,151.37 181.70,153.95 184.78,156.98 187.86,160.32 190.94,163.86 194.02,167.61 197.10,171.58 200.18,175.79 203.26,180.27 206.34,184.94 209.42,189.66 212.50,194.29 215.58,198.70 218.67,202.78 221.75,206.55 224.83,210.09 227.91,213.49 230.99,216.82 234.07,220.18 237.15,223.77 240.23,227.79 243.31,232.45 246.39,237.91 249.47,244.16 252.55,250.90 255.63,257.79 258.72,264.49 261.80,270.73 264.88,276.43 267.96,281.79 271.04,286.99 274.12,292.22 277.20,297.64 280.28,303.36 283.36,309.43 286.44,315.91 289.52,322.84 292.60,330.17 295.69,337.50 298.77,344.35 301.85,350.29 304.93,354.92 308.01,358.09 311.09,360.13 314.17,361.41 317.25,362.30 320.33,363.13 323.41,364.04 326.49,364.99 329.57,365.90 332.66,366.71 335.74,367.34 338.82,367.87 341.90,368.42 344.98,369.11 348.06,370.06 351.14,371.31 354.22,372.63 357.30,373.74 360.38,374.36 363.46,374.26 366.54,373.39 369.62,372.07 372.71,370.66 375.79,369.50 378.87,368.91 381.95,368.99 385.03,369.70 388.11,370.96 391.19,372.70 394.27,374.84 397.35,377.43 400.43,380.60 403.51,384.45 406.59,389.07 409.68,394.54 412.76,400.75 415.84,407.61 418.92,414.99 422.00,422.80 425.08,430.81 428.16,438.61 431.24,445.78 434.32,451.94 437.40,456.75 440.48,459.94 443.56,461.35 446.64,460.81 449.73,458.21 452.81,453.49 455.89,447.01 458.97,439.33 462.05,430.98 465.13,422.43 468.21,414.13 471.29,406.44 474.37,399.66 477.45,394.05 480.53,389.84 483.61,387.06 486.70,385.46 489.78,384.74 492.86,384.61 495.94,384.83 499.02,385.28 502.10,386.00 505.18,387.02 508.26,388.39 511.34,390.17 514.42,392.34 517.50,394.89 520.58,397.79 523.66,401.03 526.75,404.58 529.83,408.43 532.91,412.59 535.99,417.03 539.07,421.76 542.15,426.69 545.23,431.59 548.31,436.21 551.39,440.34 554.47,443.79 557.55,446.50 560.63,448.55 563.72,450.03 566.80,451.03 569.88,451.61 572.96,451.76 576.04,451.44 579.12,450.59 582.20,449.17 585.28,447.21 588.36,445.03 591.44,443.01 594.52,441.49 597.60,440.78 600.68,440.98 603.77,441.77 606.85,442.82 609.93,443.80 613.01,444.44 616.09,444.65 619.17,444.58 622.25,444.36 625.33,444.15 628.41,444.06 631.49,444.11 634.57,444.28 637.65,444.52 640.74,444.80 643.82,445.02 646.90,444.83 649.98,443.87 653.06,441.79 656.14,438.28 659.22,433.40 662.30,427.83 665.38,422.27 668.46,417.37 671.54,413.73 674.62,411.45 677.70,410.23 680.79,409.74 683.87,409.66 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,110.80 73.87,110.91 76.95,111.31 80.03,112.20 83.11,113.75 86.19,116.10 89.27,119.21 92.35,122.88 95.43,126.90 98.51,131.07 101.59,135.20 104.68,139.21 107.76,143.09 110.84,146.82 113.92,150.39 117.00,153.77 120.08,156.73 123.16,159.04 126.24,160.46 129.32,160.77 132.40,159.89 135.48,157.93 138.56,155.00 141.65,151.27 144.73,146.84 147.81,142.11 150.89,137.66 153.97,134.09 157.05,131.91 160.13,131.52 163.21,132.78 166.29,135.21 169.37,138.35 172.45,141.75 175.53,145.07 178.61,148.28 181.70,151.45 184.78,154.67 187.86,158.02 190.94,161.56 194.02,165.31 197.10,169.27 200.18,173.45 203.26,177.85 206.34,182.58 209.42,187.86 212.50,193.89 215.58,200.87 218.67,208.92 221.75,217.62 224.83,226.31 227.91,234.35 230.99,241.17 234.07,246.38 237.15,250.21 240.23,253.11 243.31,255.48 246.39,257.73 249.47,260.11 252.55,262.69 255.63,265.46 258.72,268.39 261.80,271.48 264.88,274.84 267.96,278.72 271.04,283.36 274.12,288.99 277.20,295.75 280.28,303.31 283.36,311.12 286.44,318.64 289.52,325.37 292.60,330.93 295.69,335.29 298.77,338.52 301.85,340.71 304.93,341.95 308.01,342.48 311.09,342.79 314.17,343.39 317.25,344.73 320.33,347.20 323.41,350.72 326.49,354.72 329.57,358.64 332.66,361.92 335.74,364.14 338.82,365.39 341.90,366.07 344.98,366.57 348.06,367.26 351.14,368.43 354.22,370.05 357.30,372.01 360.38,374.21 363.46,376.53 366.54,378.83 369.62,380.95 372.71,382.69 375.79,383.93 378.87,384.52 381.95,384.69 385.03,384.98 388.11,385.93 391.19,388.03 394.27,391.67 397.35,396.63 400.43,402.37 403.51,408.37 406.59,414.14 409.68,419.31 412.76,423.83 415.84,427.74 418.92,431.11 422.00,434.00 425.08,436.41 428.16,438.15 431.24,439.03 434.32,438.86 437.40,437.51 440.48,435.09 443.56,432.00 446.64,428.61 449.73,425.29 452.81,422.34 455.89,419.87 458.97,417.86 462.05,416.29 465.13,415.13 468.21,414.31 471.29,413.64 474.37,412.90 477.45,411.92 480.53,410.52 483.61,408.61 486.70,406.26 489.78,403.58 492.86,400.64 495.94,397.54 499.02,394.46 502.10,391.63 505.18,389.28 508.26,387.61 511.34,386.78 514.42,386.72 517.50,387.28 520.58,388.28 523.66,389.58 526.75,391.04 529.83,392.64 532.91,394.36 535.99,396.22 539.07,398.20 542.15,400.34 545.23,402.72 548.31,405.40 551.39,408.44 554.47,411.91 557.55,415.70 560.63,419.58 563.72,423.33 566.80,426.74 569.88,429.64 572.96,432.09 576.04,434.26 579.12,436.31 582.20,438.40 585.28,440.63 588.36,442.94 591.44,445.23 594.52,447.39 597.60,449.34 600.68,451.04 603.77,452.51 606.85,453.83 609.93,455.02 613.01,456.15 616.09,457.13 619.17,457.80 622.25,458.00 625.33,457.59 628.41,456.45 631.49,454.70 634.57,452.58 637.65,450.28 640.74,448.00 643.82,445.91 646.90,444.05 649.98,442.43 653.06,441.04 656.14,439.89 659.22,438.93 662.30,438.06 665.38,437.19 668.46,436.23 671.54,435.09 674.62,433.74 677.70,432.15 680.79,430.32 683.87,428.26 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,135.52 73.87,135.25 76.95,134.62 80.03,133.68 83.11,132.51 86.19,131.17 89.27,129.82 92.35,128.75 95.43,128.23 98.51,128.48 101.59,129.70 104.68,131.63 107.76,133.82 110.84,135.80 113.92,137.16 117.00,137.62 120.08,137.28 123.16,136.39 126.24,135.19 129.32,133.91 132.40,132.80 135.48,132.13 138.56,132.19 141.65,133.21 144.73,135.39 147.81,138.61 150.89,142.45 153.97,146.44 157.05,150.20 160.13,153.37 163.21,155.89 166.29,157.87 169.37,159.43 172.45,160.69 175.53,161.78 178.61,162.90 181.70,164.27 184.78,166.06 187.86,168.43 190.94,171.45 194.02,174.98 197.10,178.85 200.18,182.92 203.26,187.04 206.34,191.12 209.42,195.17 212.50,199.17 215.58,203.14 218.67,207.08 221.75,211.00 224.83,214.89 227.91,218.78 230.99,222.65 234.07,226.53 237.15,230.45 240.23,234.48 243.31,238.66 246.39,243.02 249.47,247.61 252.55,252.41 255.63,257.43 258.72,262.65 261.80,268.08 264.88,273.71 267.96,279.58 271.04,285.70 274.12,292.08 277.20,298.74 280.28,305.59 283.36,312.48 286.44,319.29 289.52,325.89 292.60,332.16 295.69,337.85 298.77,342.72 301.85,346.54 304.93,349.10 308.01,350.40 311.09,350.80 314.17,350.68 317.25,350.41 320.33,350.33 323.41,350.64 326.49,351.44 329.57,352.79 332.66,354.73 335.74,357.28 338.82,360.32 341.90,363.62 344.98,367.00 348.06,370.26 351.14,373.25 354.22,375.87 357.30,378.08 360.38,379.80 363.46,380.99 366.54,381.71 369.62,382.16 372.71,382.55 375.79,383.08 378.87,383.93 381.95,385.21 385.03,386.96 388.11,389.18 391.19,391.91 394.27,395.11 397.35,398.63 400.43,402.22 403.51,405.66 406.59,408.74 409.68,411.31 412.76,413.42 415.84,415.17 418.92,416.68 422.00,418.03 425.08,419.29 428.16,420.46 431.24,421.52 434.32,422.46 437.40,423.25 440.48,423.87 443.56,424.26 446.64,424.39 449.73,424.21 452.81,423.69 455.89,422.86 458.97,421.75 462.05,420.41 465.13,418.89 468.21,417.19 471.29,415.26 474.37,413.02 477.45,410.38 480.53,407.29 483.61,403.76 486.70,400.00 489.78,396.22 492.86,392.62 495.94,389.36 499.02,386.64 502.10,384.62 505.18,383.44 508.26,383.24 511.34,384.11 514.42,385.93 517.50,388.47 520.58,391.52 523.66,394.89 526.75,398.39 529.83,401.90 532.91,405.31 535.99,408.52 539.07,411.45 542.15,414.09 545.23,416.46 548.31,418.62 551.39,420.62 554.47,422.51 557.55,424.29 560.63,425.97 563.72,427.52 566.80,428.94 569.88,430.20 572.96,431.33 576.04,432.38 579.12,433.39 582.20,434.39 585.28,435.41 588.36,436.50 591.44,437.68 594.52,439.01 597.60,440.50 600.68,442.15 603.77,443.89 606.85,445.66 609.93,447.39 613.01,449.02 616.09,450.47 619.17,451.61 622.25,452.33 625.33,452.53 628.41,452.14 631.49,451.18 634.57,449.72 637.65,447.84 640.74,445.59 643.82,443.11 646.90,440.65 649.98,438.54 653.06,437.03 656.14,436.38 659.22,436.69 662.30,437.85 665.38,439.73 668.46,442.17 671.54,445.06 674.62,448.24 677.70,451.58 680.79,454.95 683.87,458.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,169.96 73.87,169.55 76.95,168.63 80.03,167.33 83.11,165.77 86.19,164.07 89.27,162.32 92.35,160.53 95.43,158.73 98.51,156.94 101.59,155.18 104.68,153.44 107.76,151.74 110.84,150.06 113.92,148.40 117.00,146.77 120.08,145.20 123.16,143.69 126.24,142.27 129.32,140.96 132.40,139.80 135.48,138.89 138.56,138.32 141.65,138.17 144.73,138.52 147.81,139.26 150.89,140.14 153.97,140.88 157.05,141.25 160.13,141.06 163.21,140.45 166.29,139.79 169.37,139.39 172.45,139.56 175.53,140.56 178.61,142.51 181.70,145.51 184.78,149.60 187.86,154.84 190.94,161.10 194.02,167.97 197.10,174.99 200.18,181.75 203.26,187.91 206.34,193.37 209.42,198.40 212.50,203.22 215.58,208.10 218.67,213.26 221.75,218.80 224.83,224.81 227.91,231.31 230.99,238.36 234.07,245.88 237.15,253.48 240.23,260.68 243.31,267.02 246.39,272.10 249.47,275.74 252.55,278.16 255.63,279.65 258.72,280.47 261.80,280.91 264.88,281.29 267.96,282.04 271.04,283.56 274.12,286.18 277.20,290.18 280.28,295.31 283.36,301.08 286.44,307.02 289.52,312.68 292.60,317.75 295.69,322.30 298.77,326.52 301.85,330.62 304.93,334.79 308.01,339.08 311.09,343.30 314.17,347.22 317.25,350.63 320.33,353.33 323.41,355.29 326.49,356.62 329.57,357.44 332.66,357.87 335.74,358.03 338.82,358.06 341.90,358.10 344.98,358.30 348.06,358.78 351.14,359.59 354.22,360.64 357.30,361.77 360.38,362.83 363.46,363.69 366.54,364.38 369.62,365.25 372.71,366.70 375.79,369.08 378.87,372.71 381.95,377.53 385.03,383.18 388.11,389.26 391.19,395.40 394.27,401.30 397.35,406.78 400.43,411.83 403.51,416.40 406.59,420.48 409.68,424.08 412.76,427.22 415.84,429.94 418.92,432.26 422.00,434.22 425.08,435.84 428.16,437.13 431.24,438.10 434.32,438.74 437.40,439.05 440.48,438.98 443.56,438.39 446.64,437.16 449.73,435.18 452.81,432.37 455.89,428.81 458.97,424.68 462.05,420.13 465.13,415.33 468.21,410.42 471.29,405.57 474.37,400.93 477.45,396.65 480.53,392.85 483.61,389.58 486.70,386.75 489.78,384.28 492.86,382.08 495.94,380.05 499.02,378.32 502.10,377.14 505.18,376.77 508.26,377.46 511.34,379.37 514.42,382.41 517.50,386.30 520.58,390.80 523.66,395.66 526.75,400.67 529.83,405.70 532.91,410.63 535.99,415.36 539.07,419.82 542.15,423.93 545.23,427.57 548.31,430.67 551.39,433.13 554.47,434.91 557.55,436.08 560.63,436.86 563.72,437.48 566.80,438.13 569.88,438.99 572.96,440.08 576.04,441.39 579.12,442.87 582.20,444.49 585.28,446.18 588.36,447.77 591.44,449.06 594.52,449.88 597.60,450.08 600.68,449.64 603.77,448.78 606.85,447.76 609.93,446.80 613.01,446.11 616.09,445.66 619.17,445.22 622.25,444.56 625.33,443.45 628.41,441.74 631.49,439.66 634.57,437.60 637.65,435.94 640.74,435.05 643.82,435.16 646.90,436.22 649.98,438.07 653.06,440.57 656.14,443.58 659.22,446.91 662.30,450.33 665.38,453.59 668.46,456.47 671.54,458.80 674.62,460.60 677.70,462.06 680.79,463.38 683.87,464.73 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,161.73 73.87,161.61 76.95,161.28 80.03,160.71 83.11,159.85 86.19,158.69 89.27,157.24 92.35,155.52 95.43,153.57 98.51,151.43 101.59,149.15 104.68,146.87 107.76,144.82 110.84,143.19 113.92,142.16 117.00,141.86 120.08,142.22 123.16,143.14 126.24,144.50 129.32,146.19 132.40,148.06 135.48,149.82 138.56,151.19 141.65,151.92 144.73,151.80 147.81,150.83 150.89,149.27 153.97,147.36 157.05,145.36 160.13,143.48 163.21,142.03 166.29,141.35 169.37,141.71 172.45,143.38 175.53,146.47 178.61,150.62 181.70,155.32 184.78,160.11 187.86,164.55 190.94,168.41 194.02,171.84 197.10,175.06 200.18,178.26 203.26,181.65 206.34,185.37 209.42,189.53 212.50,194.23 215.58,199.55 218.67,205.52 221.75,212.05 224.83,218.95 227.91,226.03 230.99,233.14 234.07,240.11 237.15,246.69 240.23,252.68 243.31,257.85 246.39,262.03 249.47,265.15 252.55,267.33 255.63,268.72 258.72,269.46 261.80,269.71 264.88,269.79 267.96,270.20 271.04,271.41 274.12,273.86 277.20,277.88 280.28,283.24 283.36,289.42 286.44,295.92 289.52,302.26 292.60,308.07 295.69,313.30 298.77,317.96 301.85,322.13 304.93,325.84 308.01,329.19 311.09,332.29 314.17,335.26 317.25,338.21 320.33,341.23 323.41,344.27 326.49,347.11 329.57,349.57 332.66,351.45 335.74,352.62 338.82,353.32 341.90,354.01 344.98,355.08 348.06,356.95 351.14,359.84 354.22,363.60 357.30,367.94 360.38,372.57 363.46,377.22 366.54,381.69 369.62,385.85 372.71,389.60 375.79,392.86 378.87,395.57 381.95,397.79 385.03,399.72 388.11,401.53 391.19,403.42 394.27,405.53 397.35,407.96 400.43,410.79 403.51,414.06 406.59,417.81 409.68,422.02 412.76,426.41 415.84,430.64 418.92,434.41 422.00,437.44 425.08,439.63 428.16,441.22 431.24,442.48 434.32,443.66 437.40,445.00 440.48,446.44 443.56,447.64 446.64,448.24 449.73,447.92 452.81,446.41 455.89,443.75 458.97,440.10 462.05,435.66 465.13,430.61 468.21,425.09 471.29,419.28 474.37,413.29 477.45,407.24 480.53,401.24 483.61,395.40 486.70,389.84 489.78,384.67 492.86,379.99 495.94,375.90 499.02,372.42 502.10,369.52 505.18,367.20 508.26,365.40 511.34,364.14 514.42,363.49 517.50,363.61 520.58,364.65 523.66,366.73 526.75,369.92 529.83,374.06 532.91,378.94 535.99,384.38 539.07,390.20 542.15,396.24 545.23,402.36 548.31,408.42 551.39,414.33 554.47,419.99 557.55,425.33 560.63,430.31 563.72,434.90 566.80,439.05 569.88,442.78 572.96,446.21 576.04,449.55 579.12,452.99 582.20,456.71 585.28,460.80 588.36,465.11 591.44,469.44 594.52,473.59 597.60,477.37 600.68,480.61 603.77,483.10 606.85,484.64 609.93,485.08 613.01,484.29 616.09,482.26 619.17,479.17 622.25,475.16 625.33,470.39 628.41,465.00 631.49,459.17 634.57,453.10 637.65,446.95 640.74,440.87 643.82,434.99 646.90,429.43 649.98,424.29 653.06,419.64 656.14,415.56 659.22,412.07 662.30,409.11 665.38,406.65 668.46,404.63 671.54,402.99 674.62,401.63 677.70,400.45 680.79,399.30 683.87,398.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,83.67 73.87,84.50 76.95,86.46 80.03,89.44 83.11,93.30 86.19,97.91 89.27,103.08 92.35,108.57 95.43,114.17 98.51,119.68 101.59,124.93 104.68,129.84 107.76,134.40 110.84,138.62 113.92,142.49 117.00,146.00 120.08,148.98 123.16,151.27 126.24,152.68 129.32,153.08 132.40,152.46 135.48,151.14 138.56,149.45 141.65,147.73 144.73,146.26 147.81,145.24 150.89,144.81 153.97,145.05 157.05,146.05 160.13,147.84 163.21,150.22 166.29,152.85 169.37,155.39 172.45,157.55 175.53,159.16 178.61,160.45 181.70,161.79 184.78,163.53 187.86,165.98 190.94,169.29 194.02,173.28 197.10,177.74 200.18,182.45 203.26,187.21 206.34,191.92 209.42,196.58 212.50,201.21 215.58,205.82 218.67,210.44 221.75,215.05 224.83,219.58 227.91,224.01 230.99,228.29 234.07,232.39 237.15,236.38 240.23,240.30 243.31,244.21 246.39,248.18 249.47,252.18 252.55,256.06 255.63,259.65 258.72,262.79 261.80,265.35 264.88,267.45 267.96,269.45 271.04,271.70 274.12,274.55 277.20,278.27 280.28,282.89 283.36,288.33 286.44,294.48 289.52,301.23 292.60,308.45 295.69,315.87 298.77,323.21 301.85,330.20 304.93,336.62 308.01,342.34 311.09,347.39 314.17,351.84 317.25,355.79 320.33,359.29 323.41,362.44 326.49,365.35 329.57,368.08 332.66,370.74 335.74,373.37 338.82,375.84 341.90,377.91 344.98,379.37 348.06,380.02 351.14,379.76 354.22,378.79 357.30,377.42 360.38,375.94 363.46,374.61 366.54,373.64 369.62,373.11 372.71,373.10 375.79,373.66 378.87,374.83 381.95,376.53 385.03,378.57 388.11,380.78 391.19,382.98 394.27,385.05 397.35,387.20 400.43,389.76 403.51,393.06 406.59,397.42 409.68,402.97 412.76,409.21 415.84,415.54 418.92,421.35 422.00,426.11 425.08,429.48 428.16,431.50 431.24,432.24 434.32,431.82 437.40,430.34 440.48,428.04 443.56,425.28 446.64,422.40 449.73,419.69 452.81,417.43 455.89,415.61 458.97,414.15 462.05,412.94 465.13,411.86 468.21,410.85 471.29,410.05 474.37,409.60 477.45,409.65 480.53,410.36 483.61,411.73 486.70,413.49 489.78,415.40 492.86,417.19 495.94,418.65 499.02,419.72 502.10,420.49 505.18,421.06 508.26,421.53 511.34,422.00 514.42,422.46 517.50,422.86 520.58,423.17 523.66,423.33 526.75,423.33 529.83,423.29 532.91,423.34 535.99,423.60 539.07,424.18 542.15,425.13 545.23,426.37 548.31,427.82 551.39,429.40 554.47,431.03 557.55,432.60 560.63,434.02 563.72,435.18 566.80,435.98 569.88,436.38 572.96,436.45 576.04,436.36 579.12,436.26 582.20,436.29 585.28,436.53 588.36,436.83 591.44,437.02 594.52,436.92 597.60,436.37 600.68,435.33 603.77,433.98 606.85,432.52 609.93,431.13 613.01,429.99 616.09,429.23 619.17,428.97 622.25,429.31 625.33,430.32 628.41,432.06 631.49,434.34 634.57,436.89 637.65,439.48 640.74,441.85 643.82,443.83 646.90,445.46 649.98,446.77 653.06,447.85 656.14,448.75 659.22,449.53 662.30,450.21 665.38,450.83 668.46,451.40 671.54,451.93 674.62,452.49 677.70,453.20 680.79,454.14 683.87,455.41 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,114.64 73.87,115.08 76.95,116.11 80.03,117.69 83.11,119.75 86.19,122.22 89.27,124.96 92.35,127.76 95.43,130.41 98.51,132.74 101.59,134.60 104.68,136.13 107.76,137.58 110.84,139.23 113.92,141.30 117.00,143.94 120.08,146.96 123.16,150.04 126.24,152.90 129.32,155.28 132.40,157.00 135.48,158.06 138.56,158.47 141.65,158.28 144.73,157.52 147.81,156.28 150.89,154.69 153.97,152.86 157.05,150.91 160.13,148.95 163.21,147.05 166.29,145.29 169.37,143.74 172.45,142.44 175.53,141.49 178.61,141.20 181.70,141.93 184.78,144.02 187.86,147.74 190.94,153.13 194.02,159.69 197.10,166.90 200.18,174.24 203.26,181.26 206.34,187.72 209.42,193.58 212.50,198.82 215.58,203.46 218.67,207.53 221.75,211.19 224.83,214.66 227.91,218.14 230.99,221.82 234.07,225.83 237.15,230.14 240.23,234.69 243.31,239.40 246.39,244.20 249.47,249.03 252.55,253.81 255.63,258.49 258.72,263.04 261.80,267.41 264.88,271.67 267.96,276.02 271.04,280.64 274.12,285.70 277.20,291.32 280.28,297.45 283.36,303.89 286.44,310.46 289.52,317.01 292.60,323.35 295.69,329.28 298.77,334.57 301.85,339.04 304.93,342.52 308.01,344.98 311.09,346.68 314.17,347.90 317.25,348.90 320.33,349.93 323.41,351.10 326.49,352.42 329.57,353.89 332.66,355.49 335.74,357.19 338.82,358.95 341.90,360.71 344.98,362.42 348.06,364.02 351.14,365.50 354.22,366.98 357.30,368.59 360.38,370.45 363.46,372.69 366.54,375.32 369.62,378.16 372.71,381.02 375.79,383.71 378.87,386.07 381.95,388.21 385.03,390.48 388.11,393.22 391.19,396.77 394.27,401.37 397.35,406.85 400.43,412.82 403.51,418.90 406.59,424.73 409.68,430.02 412.76,434.74 415.84,438.89 418.92,442.52 422.00,445.64 425.08,448.27 428.16,450.28 431.24,451.59 434.32,452.09 437.40,451.69 440.48,450.37 443.56,448.16 446.64,445.07 449.73,441.14 452.81,436.42 455.89,430.95 458.97,424.82 462.05,418.10 465.13,410.86 468.21,403.19 471.29,395.37 474.37,387.68 477.45,380.38 480.53,373.72 483.61,367.90 486.70,363.13 489.78,359.58 492.86,357.40 495.94,356.72 499.02,357.49 502.10,359.54 505.18,362.67 508.26,366.72 511.34,371.50 514.42,376.70 517.50,381.96 520.58,386.94 523.66,391.36 526.75,395.02 529.83,398.09 532.91,400.83 535.99,403.46 539.07,406.22 542.15,409.20 545.23,412.29 548.31,415.34 551.39,418.21 554.47,420.78 557.55,423.04 560.63,425.10 563.72,427.06 566.80,429.03 569.88,431.10 572.96,433.34 576.04,435.82 579.12,438.61 582.20,441.74 585.28,445.22 588.36,448.92 591.44,452.66 594.52,456.28 597.60,459.63 600.68,462.61 603.77,465.13 606.85,467.14 609.93,468.58 613.01,469.43 616.09,469.67 619.17,469.31 622.25,468.37 625.33,466.87 628.41,464.85 631.49,462.43 634.57,459.81 637.65,457.17 640.74,454.66 643.82,452.36 646.90,450.09 649.98,447.63 653.06,444.78 656.14,441.33 659.22,437.24 662.30,432.76 665.38,428.12 668.46,423.58 671.54,419.34 674.62,415.58 677.70,412.38 680.79,409.85 683.87,408.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,174.77 73.87,174.38 76.95,173.34 80.03,171.58 83.11,169.01 86.19,165.60 89.27,161.47 92.35,156.94 95.43,152.33 98.51,147.93 101.59,143.98 104.68,140.72 107.76,138.30 110.84,136.88 113.92,136.58 117.00,137.43 120.08,139.14 123.16,141.34 126.24,143.67 129.32,145.81 132.40,147.58 135.48,149.08 138.56,150.42 141.65,151.73 144.73,153.15 147.81,154.65 150.89,156.09 153.97,157.32 157.05,158.19 160.13,158.61 163.21,158.67 166.29,158.64 169.37,158.74 172.45,159.20 175.53,160.14 178.61,161.39 181.70,162.68 184.78,163.75 187.86,164.38 190.94,164.49 194.02,164.32 197.10,164.13 200.18,164.19 203.26,164.73 206.34,166.07 209.42,168.60 212.50,172.70 215.58,178.68 218.67,186.77 221.75,196.52 224.83,207.19 227.91,218.02 230.99,228.34 234.07,237.65 237.15,245.93 240.23,253.30 243.31,259.92 246.39,265.95 249.47,271.44 252.55,276.25 255.63,280.23 258.72,283.22 261.80,285.09 264.88,286.07 267.96,286.71 271.04,287.57 274.12,289.15 277.20,291.87 280.28,295.64 283.36,300.10 286.44,304.89 289.52,309.67 292.60,314.18 295.69,318.47 298.77,322.64 301.85,326.84 304.93,331.18 308.01,335.64 311.09,339.99 314.17,343.96 317.25,347.27 320.33,349.73 323.41,351.35 326.49,352.40 329.57,353.16 332.66,353.90 335.74,354.84 338.82,356.05 341.90,357.49 344.98,359.14 348.06,360.93 351.14,362.86 354.22,364.92 357.30,367.15 360.38,369.58 363.46,372.23 366.54,375.09 369.62,378.13 372.71,381.30 375.79,384.53 378.87,387.80 381.95,391.05 385.03,394.23 388.11,397.31 391.19,400.23 394.27,402.99 397.35,405.69 400.43,408.47 403.51,411.49 406.59,414.88 409.68,418.69 412.76,422.65 415.84,426.40 418.92,429.62 422.00,432.01 425.08,433.45 428.16,434.14 431.24,434.29 434.32,434.13 437.40,433.86 440.48,433.56 443.56,433.19 446.64,432.69 449.73,432.01 452.81,431.09 455.89,429.85 458.97,428.21 462.05,426.11 465.13,423.47 468.21,420.27 471.29,416.64 474.37,412.71 477.45,408.63 480.53,404.53 483.61,400.51 486.70,396.64 489.78,393.00 492.86,389.61 495.94,386.52 499.02,383.78 502.10,381.45 505.18,379.58 508.26,378.20 511.34,377.34 514.42,376.95 517.50,376.92 520.58,377.16 523.66,377.58 526.75,378.13 529.83,378.91 532.91,380.03 535.99,381.59 539.07,383.72 542.15,386.50 545.23,390.02 548.31,394.35 551.39,399.57 554.47,405.72 557.55,412.56 560.63,419.60 563.72,426.35 566.80,432.38 569.88,437.33 572.96,441.29 576.04,444.53 579.12,447.32 582.20,449.94 585.28,452.57 588.36,455.19 591.44,457.72 594.52,460.07 597.60,462.15 600.68,463.88 603.77,465.16 606.85,465.90 609.93,466.04 613.01,465.49 616.09,464.30 619.17,462.54 622.25,460.33 625.33,457.75 628.41,454.89 631.49,451.77 634.57,448.39 637.65,444.74 640.74,440.81 643.82,436.61 646.90,432.21 649.98,427.70 653.06,423.15 656.14,418.64 659.22,414.17 662.30,409.72 665.38,405.23 668.46,400.65 671.54,395.93 674.62,391.23 677.70,386.81 680.79,382.97 683.87,379.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,169.12 73.87,168.87 76.95,168.22 80.03,167.10 83.11,165.45 86.19,163.25 89.27,160.56 92.35,157.55 95.43,154.38 98.51,151.23 101.59,148.22 104.68,145.49 107.76,143.17 110.84,141.34 113.92,140.10 117.00,139.47 120.08,139.22 123.16,139.06 126.24,138.72 129.32,137.95 132.40,136.71 135.48,135.40 138.56,134.44 141.65,134.23 144.73,135.14 147.81,137.16 150.89,139.94 153.97,143.08 157.05,146.23 160.13,149.08 163.21,151.69 166.29,154.27 169.37,157.06 172.45,160.29 175.53,164.11 178.61,168.49 181.70,173.33 184.78,178.51 187.86,183.96 190.94,189.45 194.02,194.56 197.10,198.87 200.18,201.98 203.26,203.57 206.34,203.77 209.42,203.26 212.50,202.67 215.58,202.62 218.67,203.63 221.75,205.74 224.83,208.74 227.91,212.41 230.99,216.52 234.07,220.89 237.15,225.47 240.23,230.25 243.31,235.24 246.39,240.43 249.47,245.83 252.55,251.41 255.63,257.15 258.72,263.03 261.80,269.04 264.88,275.12 267.96,281.22 271.04,287.25 274.12,293.15 277.20,298.88 280.28,304.31 283.36,309.31 286.44,313.78 289.52,317.61 292.60,320.74 295.69,323.26 298.77,325.30 301.85,326.97 304.93,328.40 308.01,329.71 311.09,331.04 314.17,332.54 317.25,334.33 320.33,336.52 323.41,339.08 326.49,341.90 329.57,344.84 332.66,347.78 335.74,350.60 338.82,353.20 341.90,355.48 344.98,357.35 348.06,358.74 351.14,359.68 354.22,360.57 357.30,361.90 360.38,364.10 363.46,367.59 366.54,372.43 369.62,378.07 372.71,383.88 375.79,389.28 378.87,393.76 381.95,397.22 385.03,400.02 388.11,402.53 391.19,405.10 394.27,408.05 397.35,411.35 400.43,414.81 403.51,418.24 406.59,421.46 409.68,424.32 412.76,426.75 415.84,428.71 418.92,430.18 422.00,431.13 425.08,431.62 428.16,431.83 431.24,431.95 434.32,432.16 437.40,432.61 440.48,433.27 443.56,433.91 446.64,434.31 449.73,434.26 452.81,433.57 455.89,432.19 458.97,430.10 462.05,427.34 465.13,423.91 468.21,419.90 471.29,415.62 474.37,411.44 477.45,407.69 480.53,404.67 483.61,402.51 486.70,401.04 489.78,400.05 492.86,399.35 495.94,398.73 499.02,398.21 502.10,397.97 505.18,398.19 508.26,399.05 511.34,400.66 514.42,402.77 517.50,404.95 520.58,406.80 523.66,407.94 526.75,408.14 529.83,407.63 532.91,406.72 535.99,405.75 539.07,405.00 542.15,404.67 545.23,404.75 548.31,405.20 551.39,405.97 554.47,407.04 557.55,408.42 560.63,410.21 563.72,412.51 566.80,415.41 569.88,418.95 572.96,423.00 576.04,427.33 579.12,431.69 582.20,435.89 585.28,439.75 588.36,443.08 591.44,445.74 594.52,447.59 597.60,448.52 600.68,448.54 603.77,447.89 606.85,446.81 609.93,445.53 613.01,444.25 616.09,443.08 619.17,442.02 622.25,441.06 625.33,440.20 628.41,439.40 631.49,438.61 634.57,437.74 637.65,436.72 640.74,435.47 643.82,433.97 646.90,432.23 649.98,430.30 653.06,428.23 656.14,426.07 659.22,423.89 662.30,421.80 665.38,419.90 668.46,418.31 671.54,417.10 674.62,416.26 677.70,415.71 680.79,415.34 683.87,415.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,127.89 73.87,127.91 76.95,127.93 80.03,127.89 83.11,127.74 86.19,127.46 89.27,127.17 92.35,127.17 95.43,127.76 98.51,129.21 101.59,131.73 104.68,135.04 107.76,138.62 110.84,141.96 113.92,144.60 117.00,146.18 120.08,146.80 123.16,146.66 126.24,145.98 129.32,144.94 132.40,143.76 135.48,142.64 138.56,141.75 141.65,141.27 144.73,141.33 147.81,141.94 150.89,142.99 153.97,144.33 157.05,145.87 160.13,147.48 163.21,149.19 166.29,151.06 169.37,153.17 172.45,155.59 175.53,158.37 178.61,161.52 181.70,165.01 184.78,168.83 187.86,172.96 190.94,177.34 194.02,181.83 197.10,186.30 200.18,190.61 203.26,194.65 206.34,198.34 209.42,201.62 212.50,204.44 215.58,206.77 218.67,208.60 221.75,210.19 224.83,211.92 227.91,214.15 230.99,217.21 234.07,221.28 237.15,226.02 240.23,231.00 243.31,235.77 246.39,239.93 249.47,243.34 252.55,246.32 255.63,249.28 258.72,252.59 261.80,256.60 264.88,261.43 267.96,267.05 271.04,273.36 274.12,280.28 277.20,287.70 280.28,295.36 283.36,302.90 286.44,310.00 289.52,316.36 292.60,321.82 295.69,326.60 298.77,331.03 301.85,335.45 304.93,340.13 308.01,345.16 311.09,350.17 314.17,354.75 317.25,358.50 320.33,361.09 323.41,362.54 326.49,363.24 329.57,363.60 332.66,364.00 335.74,364.75 338.82,365.90 341.90,367.30 344.98,368.82 348.06,370.31 351.14,371.69 354.22,372.96 357.30,374.18 360.38,375.39 363.46,376.66 366.54,378.00 369.62,379.39 372.71,380.80 375.79,382.19 378.87,383.55 381.95,384.99 385.03,386.80 388.11,389.25 391.19,392.57 394.27,396.95 397.35,402.16 400.43,407.80 403.51,413.45 406.59,418.74 409.68,423.38 412.76,427.25 415.84,430.31 418.92,432.52 422.00,433.89 425.08,434.47 428.16,434.49 431.24,434.17 434.32,433.72 437.40,433.33 440.48,432.93 443.56,432.27 446.64,431.04 449.73,429.01 452.81,425.95 455.89,422.05 458.97,417.65 462.05,413.08 465.13,408.67 468.21,404.67 471.29,401.27 474.37,398.58 477.45,396.70 480.53,395.71 483.61,395.62 486.70,396.29 489.78,397.58 492.86,399.33 495.94,401.42 499.02,403.68 502.10,405.88 505.18,407.84 508.26,409.36 511.34,410.32 514.42,410.65 517.50,410.34 520.58,409.40 523.66,407.84 526.75,405.73 529.83,403.44 532.91,401.38 535.99,399.92 539.07,399.41 542.15,400.04 545.23,401.78 548.31,404.53 551.39,408.22 554.47,412.74 557.55,417.84 560.63,423.11 563.72,428.18 566.80,432.68 569.88,436.34 572.96,439.18 576.04,441.33 579.12,442.96 582.20,444.22 585.28,445.25 588.36,446.15 591.44,447.02 594.52,447.94 597.60,448.97 600.68,450.13 603.77,451.36 606.85,452.58 609.93,453.74 613.01,454.76 616.09,455.57 619.17,456.09 622.25,456.23 625.33,455.92 628.41,455.10 631.49,453.79 634.57,452.02 637.65,449.81 640.74,447.22 643.82,444.29 646.90,441.13 649.98,437.89 653.06,434.66 656.14,431.55 659.22,428.58 662.30,425.63 665.38,422.55 668.46,419.22 671.54,415.52 674.62,411.43 677.70,406.98 680.79,402.25 683.87,397.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,203.10 73.87,203.20 76.95,203.17 80.03,202.66 83.11,201.35 86.19,198.95 89.27,195.37 92.35,190.79 95.43,185.37 98.51,179.28 101.59,172.71 104.68,166.03 107.76,159.72 110.84,154.20 113.92,149.88 117.00,146.99 120.08,145.36 123.16,144.67 126.24,144.59 129.32,144.84 132.40,145.19 135.48,145.57 138.56,145.92 141.65,146.21 144.73,146.44 147.81,146.66 150.89,147.05 153.97,147.78 157.05,149.01 160.13,150.85 163.21,153.17 166.29,155.66 169.37,158.06 172.45,160.12 175.53,161.68 178.61,162.99 181.70,164.38 184.78,166.17 187.86,168.68 190.94,172.09 194.02,176.42 197.10,181.66 200.18,187.79 203.26,194.75 206.34,202.17 209.42,209.32 212.50,215.51 215.58,220.09 218.67,222.56 221.75,223.20 224.83,222.66 227.91,221.61 230.99,220.65 234.07,220.28 237.15,220.58 240.23,221.51 243.31,223.01 246.39,225.00 249.47,227.47 252.55,230.58 255.63,234.47 258.72,239.29 261.80,245.15 264.88,252.00 267.96,259.56 271.04,267.58 274.12,275.83 277.20,284.07 280.28,292.08 283.36,299.66 286.44,306.60 289.52,312.76 292.60,318.03 295.69,322.57 298.77,326.61 301.85,330.37 304.93,334.04 308.01,337.73 311.09,341.40 314.17,344.98 317.25,348.41 320.33,351.61 323.41,354.47 326.49,356.84 329.57,358.57 332.66,359.53 335.74,359.64 338.82,359.19 341.90,358.61 344.98,358.36 348.06,358.82 351.14,360.25 354.22,362.48 357.30,365.21 360.38,368.15 363.46,371.03 366.54,373.73 369.62,376.45 372.71,379.40 375.79,382.81 378.87,386.87 381.95,391.59 385.03,396.80 388.11,402.34 391.19,408.03 394.27,413.72 397.35,419.33 400.43,424.77 403.51,429.98 406.59,434.93 409.68,439.54 412.76,443.74 415.84,447.41 418.92,450.46 422.00,452.82 425.08,454.39 428.16,455.09 431.24,454.80 434.32,453.44 437.40,450.95 440.48,447.33 443.56,442.69 446.64,437.11 449.73,430.68 452.81,423.53 455.89,416.04 458.97,408.71 462.05,402.02 465.13,396.39 468.21,392.07 471.29,388.81 474.37,386.25 477.45,384.00 480.53,381.72 483.61,379.31 486.70,377.03 489.78,375.21 492.86,374.17 495.94,374.18 499.02,375.23 502.10,377.00 505.18,379.21 508.26,381.56 511.34,383.81 514.42,385.92 517.50,387.93 520.58,389.91 523.66,391.93 526.75,394.05 529.83,396.37 532.91,398.97 535.99,401.94 539.07,405.34 542.15,409.14 545.23,413.10 548.31,417.00 551.39,420.60 554.47,423.71 557.55,426.41 560.63,429.02 563.72,431.83 566.80,435.15 569.88,439.20 572.96,443.75 576.04,448.36 579.12,452.63 582.20,456.17 585.28,458.73 588.36,460.50 591.44,461.78 594.52,462.85 597.60,463.97 600.68,465.24 603.77,466.49 606.85,467.51 609.93,468.09 613.01,468.06 616.09,467.41 619.17,466.29 622.25,464.88 625.33,463.31 628.41,461.74 631.49,460.24 634.57,458.87 637.65,457.69 640.74,456.73 643.82,455.98 646.90,455.23 649.98,454.28 653.06,452.88 656.14,450.86 659.22,448.16 662.30,444.94 665.38,441.38 668.46,437.68 671.54,433.99 674.62,430.48 677.70,427.27 680.79,424.48 683.87,422.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,158.47 73.87,158.63 76.95,158.95 80.03,159.33 83.11,159.69 86.19,159.93 89.27,159.99 92.35,159.81 95.43,159.36 98.51,158.59 101.59,157.49 104.68,156.18 107.76,154.85 110.84,153.67 113.92,152.83 117.00,152.43 120.08,152.44 123.16,152.77 126.24,153.35 129.32,154.10 132.40,154.89 135.48,155.53 138.56,155.83 141.65,155.63 144.73,154.77 147.81,153.38 150.89,151.90 153.97,150.74 157.05,150.30 160.13,150.87 163.21,152.35 166.29,154.35 169.37,156.52 172.45,158.50 175.53,160.07 178.61,161.34 181.70,162.54 184.78,163.89 187.86,165.59 190.94,167.75 194.02,170.25 197.10,172.98 200.18,175.78 203.26,178.56 206.34,181.33 209.42,184.25 212.50,187.50 215.58,191.21 218.67,195.54 221.75,200.56 224.83,206.32 227.91,212.84 230.99,220.16 234.07,228.21 237.15,236.57 240.23,244.72 243.31,252.22 246.39,258.62 249.47,263.70 252.55,267.55 255.63,270.30 258.72,272.10 261.80,273.11 264.88,273.65 267.96,274.22 271.04,275.29 274.12,277.29 277.20,280.56 280.28,285.12 283.36,290.81 286.44,297.45 289.52,304.85 292.60,312.83 295.69,321.09 298.77,329.32 301.85,337.24 304.93,344.62 308.01,351.30 311.09,357.33 314.17,362.77 317.25,367.68 320.33,372.15 323.41,376.11 326.49,379.39 329.57,381.83 332.66,383.27 335.74,383.60 338.82,382.89 341.90,381.31 344.98,379.06 348.06,376.28 351.14,373.18 354.22,370.12 357.30,367.46 360.38,365.56 363.46,364.71 366.54,365.04 369.62,366.39 372.71,368.54 375.79,371.29 378.87,374.43 381.95,377.82 385.03,381.37 388.11,385.01 391.19,388.67 394.27,392.30 397.35,395.91 400.43,399.51 403.51,403.14 406.59,406.82 409.68,410.55 412.76,414.22 415.84,417.72 418.92,420.93 422.00,423.75 425.08,426.13 428.16,428.14 431.24,429.83 434.32,431.29 437.40,432.58 440.48,433.67 443.56,434.45 446.64,434.81 449.73,434.66 452.81,433.90 455.89,432.54 458.97,430.64 462.05,428.25 465.13,425.41 468.21,422.18 471.29,418.59 474.37,414.68 477.45,410.48 480.53,406.02 483.61,401.40 486.70,396.86 489.78,392.66 492.86,389.01 495.94,386.12 499.02,384.07 502.10,382.88 505.18,382.53 508.26,382.99 511.34,384.24 514.42,386.10 517.50,388.37 520.58,390.84 523.66,393.34 526.75,395.72 529.83,397.89 532.91,399.81 535.99,401.42 539.07,402.70 542.15,403.71 545.23,404.66 548.31,405.79 551.39,407.30 554.47,409.38 557.55,412.03 560.63,415.08 563.72,418.35 566.80,421.67 569.88,424.91 572.96,428.00 576.04,430.92 579.12,433.66 582.20,436.23 585.28,438.62 588.36,440.82 591.44,442.81 594.52,444.59 597.60,446.14 600.68,447.51 603.77,448.81 606.85,450.18 609.93,451.73 613.01,453.55 616.09,455.59 619.17,457.64 622.25,459.51 625.33,460.99 628.41,461.96 631.49,462.41 634.57,462.46 637.65,462.21 640.74,461.76 643.82,461.16 646.90,460.33 649.98,459.13 653.06,457.45 656.14,455.19 659.22,452.31 662.30,448.94 665.38,445.19 668.46,441.20 671.54,437.07 674.62,432.78 677.70,428.19 680.79,423.16 683.87,417.58 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,131.88 73.87,132.61 76.95,134.07 80.03,135.82 83.11,137.44 86.19,138.54 89.27,138.98 92.35,138.91 95.43,138.49 98.51,137.88 101.59,137.24 104.68,136.72 107.76,136.46 110.84,136.58 113.92,137.19 117.00,138.34 120.08,139.87 123.16,141.56 126.24,143.19 129.32,144.59 132.40,145.63 135.48,146.34 138.56,146.78 141.65,147.00 144.73,147.07 147.81,147.07 150.89,147.15 153.97,147.42 157.05,148.02 160.13,149.02 163.21,150.36 166.29,151.91 169.37,153.53 172.45,155.09 175.53,156.49 178.61,157.66 181.70,158.60 184.78,159.27 187.86,159.67 190.94,159.92 194.02,160.41 197.10,161.57 200.18,163.78 203.26,167.36 206.34,172.36 209.42,178.57 212.50,185.73 215.58,193.61 218.67,201.95 221.75,210.39 224.83,218.45 227.91,225.73 230.99,231.85 234.07,236.62 237.15,240.30 240.23,243.33 243.31,246.11 246.39,249.02 249.47,252.33 252.55,256.09 255.63,260.34 258.72,265.07 261.80,270.28 264.88,275.88 267.96,281.72 271.04,287.65 274.12,293.54 277.20,299.25 280.28,304.68 283.36,309.73 286.44,314.33 289.52,318.42 292.60,321.98 295.69,325.28 298.77,328.64 301.85,332.34 304.93,336.66 308.01,341.58 311.09,346.60 314.17,351.15 317.25,354.70 320.33,356.80 323.41,357.42 326.49,357.00 329.57,355.99 332.66,354.82 335.74,353.88 338.82,353.37 341.90,353.42 344.98,354.11 348.06,355.50 351.14,357.62 354.22,360.37 357.30,363.61 360.38,367.22 363.46,371.10 366.54,375.09 369.62,379.01 372.71,382.69 375.79,385.95 378.87,388.69 381.95,390.98 385.03,393.14 388.11,395.50 391.19,398.36 394.27,401.94 397.35,406.24 400.43,411.09 403.51,416.34 406.59,421.84 409.68,427.39 412.76,432.64 415.84,437.24 418.92,440.84 422.00,443.16 425.08,444.06 428.16,443.74 431.24,442.42 434.32,440.33 437.40,437.68 440.48,434.67 443.56,431.48 446.64,428.30 449.73,425.27 452.81,422.50 455.89,419.90 458.97,417.27 462.05,414.40 465.13,411.13 468.21,407.33 471.29,403.05 474.37,398.41 477.45,393.52 480.53,388.48 483.61,383.45 486.70,378.69 489.78,374.45 492.86,370.96 495.94,368.42 499.02,366.94 502.10,366.56 505.18,367.29 508.26,369.16 511.34,372.13 514.42,376.10 517.50,380.88 520.58,386.33 523.66,392.28 526.75,398.57 529.83,404.95 532.91,411.14 535.99,416.91 539.07,422.05 542.15,426.45 545.23,430.20 548.31,433.41 551.39,436.19 554.47,438.64 557.55,440.82 560.63,442.79 563.72,444.56 566.80,446.17 569.88,447.63 572.96,448.93 576.04,450.05 579.12,450.97 582.20,451.68 585.28,452.15 588.36,452.39 591.44,452.42 594.52,452.26 597.60,451.91 600.68,451.39 603.77,450.71 606.85,449.88 609.93,448.93 613.01,447.86 616.09,446.76 619.17,445.75 622.25,444.97 625.33,444.54 628.41,444.53 631.49,444.86 634.57,445.34 637.65,445.82 640.74,446.12 643.82,446.13 646.90,445.86 649.98,445.33 653.06,444.58 656.14,443.65 659.22,442.59 662.30,441.50 665.38,440.48 668.46,439.61 671.54,438.98 674.62,438.57 677.70,438.32 680.79,438.18 683.87,438.08 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,92.75 73.87,93.03 76.95,93.71 80.03,94.81 83.11,96.34 86.19,98.28 89.27,100.63 92.35,103.35 95.43,106.43 98.51,109.84 101.59,113.55 104.68,117.52 107.76,121.64 110.84,125.86 113.92,130.10 117.00,134.26 120.08,138.00 123.16,140.94 126.24,142.73 129.32,143.06 132.40,141.93 135.48,139.91 138.56,137.63 141.65,135.71 144.73,134.66 147.81,134.69 150.89,135.64 153.97,137.31 157.05,139.49 160.13,142.02 163.21,144.92 166.29,148.30 169.37,152.29 172.45,157.00 175.53,162.45 178.61,168.34 181.70,174.24 184.78,179.78 187.86,184.61 190.94,188.58 194.02,191.90 197.10,194.82 200.18,197.61 203.26,200.48 206.34,203.54 209.42,206.80 212.50,210.20 215.58,213.71 218.67,217.31 221.75,221.04 224.83,225.00 227.91,229.28 230.99,233.95 234.07,239.02 237.15,244.16 240.23,248.96 243.31,253.07 246.39,256.14 249.47,258.08 252.55,259.27 255.63,260.12 258.72,261.05 261.80,262.40 264.88,264.33 267.96,266.73 271.04,269.48 274.12,272.46 277.20,275.57 280.28,278.93 283.36,282.76 286.44,287.28 289.52,292.68 292.60,299.06 295.69,306.12 298.77,313.50 301.85,320.83 304.93,327.79 308.01,334.18 311.09,340.03 314.17,345.40 317.25,350.37 320.33,355.01 323.41,359.32 326.49,363.22 329.57,366.66 332.66,369.56 335.74,371.87 338.82,373.61 341.90,374.82 344.98,375.54 348.06,375.82 351.14,375.72 354.22,375.34 357.30,374.78 360.38,374.13 363.46,373.49 366.54,372.94 369.62,372.58 372.71,372.49 375.79,372.76 378.87,373.46 381.95,374.63 385.03,376.29 388.11,378.46 391.19,381.15 394.27,384.36 397.35,388.05 400.43,392.16 403.51,396.62 406.59,401.39 409.68,406.38 412.76,411.43 415.84,416.38 418.92,421.06 422.00,425.32 425.08,429.02 428.16,431.94 431.24,433.89 434.32,434.70 437.40,434.24 440.48,432.64 443.56,430.31 446.64,427.64 449.73,424.99 452.81,422.68 455.89,420.66 458.97,418.72 462.05,416.64 465.13,414.23 468.21,411.37 471.29,408.28 474.37,405.25 477.45,402.57 480.53,400.50 483.61,399.16 486.70,398.41 489.78,398.09 492.86,398.06 495.94,398.16 499.02,398.39 502.10,398.89 505.18,399.79 508.26,401.21 511.34,403.24 514.42,405.75 517.50,408.49 520.58,411.23 523.66,413.74 526.75,415.87 529.83,417.62 532.91,419.04 535.99,420.18 539.07,421.09 542.15,421.83 545.23,422.46 548.31,423.05 551.39,423.64 554.47,424.30 557.55,425.12 560.63,426.25 563.72,427.82 566.80,429.96 569.88,432.76 572.96,436.08 576.04,439.69 579.12,443.38 582.20,446.94 585.28,450.20 588.36,453.05 591.44,455.42 594.52,457.22 597.60,458.42 600.68,459.00 603.77,459.01 606.85,458.52 609.93,457.57 613.01,456.22 616.09,454.49 619.17,452.36 622.25,449.80 625.33,446.80 628.41,443.36 631.49,439.69 634.57,436.07 637.65,432.77 640.74,430.04 643.82,428.06 646.90,426.84 649.98,426.31 653.06,426.44 656.14,427.15 659.22,428.35 662.30,429.80 665.38,431.30 668.46,432.65 671.54,433.68 674.62,434.37 677.70,434.85 680.79,435.23 683.87,435.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,105.73 73.87,105.30 76.95,104.58 80.03,104.01 83.11,103.98 86.19,104.87 89.27,106.82 92.35,109.78 95.43,113.63 98.51,118.29 101.59,123.64 104.68,129.38 107.76,135.16 110.84,140.62 113.92,145.47 117.00,149.45 120.08,152.45 123.16,154.42 126.24,155.31 129.32,155.09 132.40,153.82 135.48,151.68 138.56,148.86 141.65,145.55 144.73,141.92 147.81,138.18 150.89,134.62 153.97,131.50 157.05,129.06 160.13,127.48 163.21,126.85 166.29,127.15 169.37,128.38 172.45,130.53 175.53,133.56 178.61,137.37 181.70,141.86 184.78,146.90 187.86,152.43 190.94,158.31 194.02,164.40 197.10,170.52 200.18,176.56 203.26,182.38 206.34,187.87 209.42,192.95 212.50,197.54 215.58,201.58 218.67,205.02 221.75,208.07 224.83,211.04 227.91,214.25 230.99,217.95 234.07,222.34 237.15,227.31 240.23,232.65 243.31,238.17 246.39,243.69 249.47,249.11 252.55,254.47 255.63,259.85 258.72,265.30 261.80,270.90 264.88,276.59 267.96,282.20 271.04,287.56 274.12,292.51 277.20,296.93 280.28,300.88 283.36,304.52 286.44,308.01 289.52,311.50 292.60,315.11 295.69,318.97 298.77,323.18 301.85,327.82 304.93,332.96 308.01,338.57 311.09,344.41 314.17,350.21 317.25,355.74 320.33,360.78 323.41,365.19 326.49,368.92 329.57,371.94 332.66,374.22 335.74,375.77 338.82,376.80 341.90,377.57 344.98,378.36 348.06,379.42 351.14,380.88 354.22,382.53 357.30,384.03 360.38,385.10 363.46,385.44 366.54,384.93 369.62,383.73 372.71,382.04 375.79,380.06 378.87,377.97 381.95,376.06 385.03,374.71 388.11,374.27 391.19,375.06 394.27,377.33 397.35,380.86 400.43,385.24 403.51,390.07 406.59,394.97 409.68,399.65 412.76,404.20 415.84,408.76 418.92,413.50 422.00,418.58 425.08,423.98 428.16,429.42 431.24,434.58 434.32,439.14 437.40,442.85 440.48,445.50 443.56,446.99 446.64,447.21 449.73,446.10 452.81,443.63 455.89,440.08 458.97,435.88 462.05,431.44 465.13,427.12 468.21,423.18 471.29,419.50 474.37,415.85 477.45,412.03 480.53,407.83 483.61,403.24 486.70,398.58 489.78,394.22 492.86,390.49 495.94,387.69 499.02,385.93 502.10,385.15 505.18,385.26 508.26,386.17 511.34,387.77 514.42,389.93 517.50,392.48 520.58,395.25 523.66,398.11 526.75,400.94 529.83,403.72 532.91,406.42 535.99,409.03 539.07,411.55 542.15,413.99 545.23,416.34 548.31,418.61 551.39,420.81 554.47,422.94 557.55,425.06 560.63,427.25 563.72,429.61 566.80,432.20 569.88,435.07 572.96,438.06 576.04,440.94 579.12,443.48 582.20,445.47 585.28,446.76 588.36,447.40 591.44,447.52 594.52,447.21 597.60,446.57 600.68,445.68 603.77,444.57 606.85,443.26 609.93,441.75 613.01,440.05 616.09,438.26 619.17,436.50 622.25,434.90 625.33,433.60 628.41,432.66 631.49,431.90 634.57,431.05 637.65,429.81 640.74,427.94 643.82,425.31 646.90,422.13 649.98,418.69 653.06,415.29 656.14,412.19 659.22,409.57 662.30,407.50 665.38,406.00 668.46,405.10 671.54,404.82 674.62,405.05 677.70,405.65 680.79,406.45 683.87,407.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,98.18 73.87,98.64 76.95,99.54 80.03,100.58 83.11,101.48 86.19,101.97 89.27,102.17 92.35,102.58 95.43,103.69 98.51,105.98 101.59,109.82 104.68,115.08 107.76,121.38 110.84,128.30 113.92,135.48 117.00,142.54 120.08,149.02 123.16,154.48 126.24,158.51 129.32,160.76 132.40,161.11 135.48,159.82 138.56,157.24 141.65,153.69 144.73,149.48 147.81,144.97 150.89,140.55 153.97,136.60 157.05,133.44 160.13,131.36 163.21,130.47 166.29,130.84 169.37,132.48 172.45,135.39 175.53,139.55 178.61,144.74 181.70,150.72 184.78,157.25 187.86,164.13 190.94,171.10 194.02,177.77 197.10,183.75 200.18,188.71 203.26,192.37 206.34,194.87 209.42,196.80 212.50,198.76 215.58,201.30 218.67,204.86 221.75,209.45 224.83,214.78 227.91,220.60 230.99,226.62 234.07,232.62 237.15,238.50 240.23,244.20 243.31,249.67 246.39,254.88 249.47,259.81 252.55,264.41 255.63,268.66 258.72,272.52 261.80,275.99 264.88,279.13 267.96,282.14 271.04,285.19 274.12,288.46 277.20,292.08 280.28,296.19 283.36,300.89 286.44,306.27 289.52,312.42 292.60,319.31 295.69,326.54 298.77,333.62 301.85,340.11 304.93,345.59 308.01,349.81 311.09,352.76 314.17,354.49 317.25,355.07 320.33,354.57 323.41,353.34 326.49,351.97 329.57,351.04 332.66,351.07 335.74,352.47 338.82,355.20 341.90,358.93 344.98,363.34 348.06,368.11 351.14,372.98 354.22,377.72 357.30,382.18 360.38,386.20 363.46,389.66 366.54,392.50 369.62,394.76 372.71,396.50 375.79,397.80 378.87,398.71 381.95,399.34 385.03,399.86 388.11,400.42 391.19,401.13 394.27,402.12 397.35,403.39 400.43,404.89 403.51,406.58 406.59,408.40 409.68,410.31 412.76,412.26 415.84,414.17 418.92,416.00 422.00,417.72 425.08,419.27 428.16,420.64 431.24,421.81 434.32,422.77 437.40,423.50 440.48,423.96 443.56,424.07 446.64,423.75 449.73,422.93 452.81,421.58 455.89,419.79 458.97,417.74 462.05,415.62 465.13,413.58 468.21,411.75 471.29,410.21 474.37,409.03 477.45,408.23 480.53,407.87 483.61,407.90 486.70,408.16 489.78,408.48 492.86,408.70 495.94,408.69 499.02,408.41 502.10,407.93 505.18,407.34 508.26,406.73 511.34,406.15 514.42,405.70 517.50,405.43 520.58,405.42 523.66,405.71 526.75,406.34 529.83,407.24 532.91,408.34 535.99,409.57 539.07,410.86 542.15,412.17 545.23,413.50 548.31,414.84 551.39,416.21 554.47,417.61 557.55,418.98 560.63,420.15 563.72,421.01 566.80,421.41 569.88,421.27 572.96,420.71 576.04,419.91 579.12,419.08 582.20,418.39 585.28,417.96 588.36,417.67 591.44,417.36 594.52,416.89 597.60,416.10 600.68,415.02 603.77,413.91 606.85,413.08 609.93,412.80 613.01,413.30 616.09,414.68 619.17,416.86 622.25,419.75 625.33,423.27 628.41,427.32 631.49,431.70 634.57,436.18 637.65,440.54 640.74,444.59 643.82,448.20 646.90,451.37 649.98,454.19 653.06,456.71 656.14,459.00 659.22,461.10 662.30,463.01 665.38,464.70 668.46,466.17 671.54,467.39 674.62,468.35 677.70,468.99 680.79,469.27 683.87,469.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,115.14 73.87,116.09 76.95,117.96 80.03,120.17 83.11,122.16 86.19,123.42 89.27,123.89 92.35,124.00 95.43,124.22 98.51,124.98 101.59,126.63 104.68,129.07 107.76,131.95 110.84,134.89 113.92,137.55 117.00,139.66 120.08,141.17 123.16,142.09 126.24,142.47 129.32,142.33 132.40,141.78 135.48,141.00 138.56,140.21 141.65,139.58 144.73,139.28 147.81,139.32 150.89,139.55 153.97,139.81 157.05,139.96 160.13,139.88 163.21,139.71 166.29,139.73 169.37,140.19 172.45,141.34 175.53,143.40 178.61,146.50 181.70,150.76 184.78,156.30 187.86,163.17 190.94,171.23 194.02,179.83 197.10,188.28 200.18,195.95 203.26,202.29 206.34,207.21 209.42,211.06 212.50,214.22 215.58,217.07 218.67,219.94 221.75,222.86 224.83,225.73 227.91,228.43 230.99,230.83 234.07,232.87 237.15,234.66 240.23,236.39 243.31,238.20 246.39,240.26 249.47,242.67 252.55,245.52 255.63,248.86 258.72,252.72 261.80,257.16 264.88,262.24 267.96,268.07 271.04,274.76 274.12,282.40 277.20,291.03 280.28,300.36 283.36,309.96 286.44,319.39 289.52,328.26 292.60,336.24 295.69,343.15 298.77,348.83 301.85,353.18 304.93,356.10 308.01,357.62 311.09,357.93 314.17,357.23 317.25,355.74 320.33,353.63 323.41,351.19 326.49,348.78 329.57,346.75 332.66,345.40 335.74,344.98 338.82,345.47 341.90,346.74 344.98,348.63 348.06,351.00 351.14,353.73 354.22,356.80 357.30,360.21 360.38,363.98 363.46,368.12 366.54,372.55 369.62,377.00 372.71,381.19 375.79,384.86 378.87,387.81 381.95,390.15 385.03,392.34 388.11,394.86 391.19,398.13 394.27,402.49 397.35,407.68 400.43,413.19 403.51,418.50 406.59,423.12 409.68,426.70 412.76,429.25 415.84,430.88 418.92,431.72 422.00,431.90 425.08,431.51 428.16,430.62 431.24,429.28 434.32,427.51 437.40,425.37 440.48,422.91 443.56,420.24 446.64,417.45 449.73,414.63 452.81,411.84 455.89,409.16 458.97,406.65 462.05,404.38 465.13,402.39 468.21,400.71 471.29,399.34 474.37,398.25 477.45,397.41 480.53,396.81 483.61,396.40 486.70,396.05 489.78,395.67 492.86,395.15 495.94,394.41 499.02,393.54 502.10,392.74 505.18,392.25 508.26,392.27 511.34,392.95 514.42,394.21 517.50,395.85 520.58,397.67 523.66,399.49 526.75,401.19 529.83,402.94 532.91,404.95 535.99,407.41 539.07,410.53 542.15,414.28 545.23,418.29 548.31,422.16 551.39,425.52 554.47,428.02 557.55,429.70 560.63,430.85 563.72,431.82 566.80,432.90 569.88,434.35 572.96,436.06 576.04,437.73 579.12,439.10 582.20,439.89 585.28,439.97 588.36,439.52 591.44,438.80 594.52,438.07 597.60,437.57 600.68,437.43 603.77,437.65 606.85,438.16 609.93,438.94 613.01,439.91 616.09,440.91 619.17,441.69 622.25,442.02 625.33,441.67 628.41,440.49 631.49,438.75 634.57,436.87 637.65,435.28 640.74,434.35 643.82,434.34 646.90,435.04 649.98,436.16 653.06,437.41 656.14,438.52 659.22,439.33 662.30,439.89 665.38,440.24 668.46,440.46 671.54,440.61 674.62,440.64 677.70,440.38 680.79,439.68 683.87,438.40 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,82.14 73.87,81.77 76.95,81.10 80.03,80.43 83.11,80.02 86.19,80.14 89.27,80.98 92.35,82.68 95.43,85.35 98.51,89.09 101.59,93.94 104.68,99.74 107.76,106.21 110.84,113.08 113.92,120.11 117.00,127.06 120.08,133.70 123.16,139.81 126.24,145.18 129.32,149.66 132.40,153.12 135.48,155.51 138.56,156.79 141.65,156.95 144.73,155.99 147.81,154.17 150.89,152.08 153.97,150.27 157.05,149.25 160.13,149.41 163.21,150.62 166.29,152.41 169.37,154.34 172.45,155.99 175.53,157.05 178.61,157.69 181.70,158.17 184.78,158.76 187.86,159.74 190.94,161.25 194.02,163.33 197.10,165.96 200.18,169.11 203.26,172.77 206.34,176.96 209.42,181.74 212.50,187.21 215.58,193.41 218.67,200.39 221.75,208.09 224.83,216.35 227.91,225.06 230.99,234.09 234.07,243.28 237.15,252.24 240.23,260.57 243.31,267.89 246.39,273.85 249.47,278.29 252.55,281.32 255.63,283.11 258.72,283.81 261.80,283.61 264.88,282.95 267.96,282.62 271.04,283.33 274.12,285.75 277.20,290.38 280.28,296.84 283.36,304.32 286.44,312.02 289.52,319.18 292.60,325.24 295.69,330.13 298.77,333.97 301.85,336.87 304.93,338.97 308.01,340.41 311.09,341.34 314.17,341.88 317.25,342.16 320.33,342.28 323.41,342.35 326.49,342.48 329.57,342.77 332.66,343.30 335.74,344.13 338.82,345.18 341.90,346.30 344.98,347.37 348.06,348.23 351.14,348.86 354.22,349.48 357.30,350.41 360.38,351.94 363.46,354.35 366.54,357.71 369.62,361.77 372.71,366.25 375.79,370.88 378.87,375.39 381.95,379.73 385.03,383.97 388.11,388.21 391.19,392.56 394.27,397.10 397.35,401.84 400.43,406.72 403.51,411.69 406.59,416.71 409.68,421.70 412.76,426.56 415.84,431.14 418.92,435.34 422.00,439.03 425.08,442.07 428.16,444.26 431.24,445.36 434.32,445.21 437.40,443.63 440.48,440.88 443.56,437.60 446.64,434.39 449.73,431.84 452.81,430.38 455.89,429.79 458.97,429.50 462.05,428.96 465.13,427.62 468.21,425.17 471.29,421.91 474.37,418.27 477.45,414.71 480.53,411.63 483.61,409.20 486.70,407.18 489.78,405.26 492.86,403.18 495.94,400.66 499.02,397.76 502.10,394.85 505.18,392.28 508.26,390.37 511.34,389.41 514.42,389.43 517.50,390.36 520.58,392.09 523.66,394.53 526.75,397.54 529.83,400.82 532.91,404.06 535.99,406.96 539.07,409.25 542.15,410.91 545.23,412.28 548.31,413.76 551.39,415.71 554.47,418.46 557.55,421.98 560.63,425.94 563.72,429.99 566.80,433.82 569.88,437.15 572.96,439.97 576.04,442.43 579.12,444.65 582.20,446.76 585.28,448.86 588.36,450.88 591.44,452.75 594.52,454.38 597.60,455.69 600.68,456.62 603.77,457.13 606.85,457.17 609.93,456.73 613.01,455.78 616.09,454.35 619.17,452.48 622.25,450.25 625.33,447.70 628.41,444.91 631.49,442.03 634.57,439.28 637.65,436.85 640.74,434.90 643.82,433.54 646.90,432.61 649.98,431.91 653.06,431.25 656.14,430.45 659.22,429.43 662.30,428.27 665.38,427.08 668.46,425.96 671.54,425.01 674.62,424.25 677.70,423.68 680.79,423.28 683.87,423.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,148.00 73.87,147.14 76.95,145.36 80.03,143.08 83.11,140.69 86.19,138.59 89.27,137.02 92.35,136.12 95.43,135.97 98.51,136.63 101.59,138.14 104.68,140.24 107.76,142.55 110.84,144.70 113.92,146.33 117.00,147.22 120.08,147.41 123.16,147.07 126.24,146.34 129.32,145.37 132.40,144.27 135.48,143.02 138.56,141.58 141.65,139.92 144.73,138.02 147.81,136.06 150.89,134.44 153.97,133.54 157.05,133.72 160.13,135.27 163.21,138.10 166.29,141.93 169.37,146.47 172.45,151.48 175.53,156.68 178.61,161.76 181.70,166.43 184.78,170.42 187.86,173.50 190.94,175.63 194.02,177.13 197.10,178.38 200.18,179.72 203.26,181.46 206.34,183.74 209.42,186.50 212.50,189.66 215.58,193.15 218.67,196.88 221.75,200.83 224.83,205.01 227.91,209.43 230.99,214.10 234.07,219.05 237.15,224.44 240.23,230.45 243.31,237.24 246.39,244.97 249.47,253.53 252.55,262.40 255.63,271.00 258.72,278.80 261.80,285.33 264.88,290.44 267.96,294.34 271.04,297.24 274.12,299.38 277.20,300.96 280.28,302.23 283.36,303.45 286.44,304.84 289.52,306.60 292.60,308.87 295.69,311.71 298.77,315.14 301.85,319.16 304.93,323.76 308.01,328.88 311.09,334.34 314.17,339.96 317.25,345.58 320.33,351.04 323.41,356.25 326.49,361.16 329.57,365.73 332.66,369.93 335.74,373.75 338.82,377.11 341.90,379.93 344.98,382.15 348.06,383.69 351.14,384.51 354.22,384.68 357.30,384.28 360.38,383.39 363.46,382.10 366.54,380.57 369.62,379.15 372.71,378.21 375.79,378.05 378.87,378.95 381.95,380.95 385.03,383.82 388.11,387.32 391.19,391.22 394.27,395.32 397.35,399.42 400.43,403.31 403.51,406.84 406.59,409.86 409.68,412.31 412.76,414.44 415.84,416.57 418.92,419.01 422.00,422.03 425.08,425.63 428.16,429.30 431.24,432.50 434.32,434.70 437.40,435.45 440.48,434.81 443.56,433.28 446.64,431.41 449.73,429.70 452.81,428.56 455.89,427.88 458.97,427.29 462.05,426.42 465.13,424.92 468.21,422.54 471.29,419.40 474.37,415.69 477.45,411.61 480.53,407.35 483.61,403.04 486.70,398.76 489.78,394.56 492.86,390.47 495.94,386.52 499.02,382.83 502.10,379.51 505.18,376.71 508.26,374.54 511.34,373.11 514.42,372.48 517.50,372.65 520.58,373.66 523.66,375.51 526.75,378.20 529.83,381.67 532.91,385.85 535.99,390.68 539.07,396.10 542.15,401.95 545.23,407.89 548.31,413.57 551.39,418.68 554.47,422.95 557.55,426.45 560.63,429.53 563.72,432.56 566.80,435.86 569.88,439.72 572.96,443.96 576.04,448.24 579.12,452.21 582.20,455.55 585.28,458.00 588.36,459.56 591.44,460.26 594.52,460.16 597.60,459.33 600.68,457.86 603.77,455.94 606.85,453.74 609.93,451.42 613.01,449.12 616.09,447.03 619.17,445.36 622.25,444.31 625.33,444.04 628.41,444.67 631.49,446.13 634.57,448.23 637.65,450.81 640.74,453.70 643.82,456.70 646.90,459.49 649.98,461.72 653.06,463.09 656.14,463.33 659.22,462.42 662.30,460.81 665.38,458.95 668.46,457.29 671.54,456.23 674.62,455.87 677.70,456.11 680.79,456.81 683.87,457.84 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,123.50 73.87,124.06 76.95,125.09 80.03,126.14 83.11,126.78 86.19,126.64 89.27,125.72 92.35,124.44 95.43,123.25 98.51,122.56 101.59,122.73 104.68,123.80 107.76,125.69 110.84,128.24 113.92,131.35 117.00,134.85 120.08,138.37 123.16,141.52 126.24,143.95 129.32,145.33 132.40,145.50 135.48,144.57 138.56,142.70 141.65,140.06 144.73,136.79 147.81,133.24 150.89,129.91 153.97,127.29 157.05,125.82 160.13,125.85 163.21,127.43 166.29,130.45 169.37,134.78 172.45,140.27 175.53,146.72 178.61,153.66 181.70,160.53 184.78,166.85 187.86,172.18 190.94,176.44 194.02,180.22 197.10,184.20 200.18,188.99 203.26,195.16 206.34,202.66 209.42,210.82 212.50,218.93 215.58,226.35 218.67,232.53 221.75,237.33 224.83,240.90 227.91,243.37 230.99,244.91 234.07,245.68 237.15,245.85 240.23,245.61 243.31,245.10 246.39,244.47 249.47,243.91 252.55,243.78 255.63,244.41 258.72,246.09 261.80,249.10 264.88,253.46 267.96,259.00 271.04,265.53 274.12,272.85 277.20,280.79 280.28,289.10 283.36,297.52 286.44,305.80 289.52,313.74 292.60,321.17 295.69,328.06 298.77,334.42 301.85,340.27 304.93,345.65 308.01,350.50 311.09,354.65 314.17,357.93 317.25,360.17 320.33,361.24 323.41,361.27 326.49,360.63 329.57,359.73 332.66,358.92 335.74,358.50 338.82,358.60 341.90,359.22 344.98,360.34 348.06,361.95 351.14,364.03 354.22,366.56 357.30,369.55 360.38,373.00 363.46,376.90 366.54,381.15 369.62,385.41 372.71,389.35 375.79,392.67 378.87,395.09 381.95,396.61 385.03,397.42 388.11,397.77 391.19,397.88 394.27,397.94 397.35,398.01 400.43,398.05 403.51,398.05 406.59,397.98 409.68,397.85 412.76,397.96 415.84,398.62 418.92,400.15 422.00,402.82 425.08,406.61 428.16,410.96 431.24,415.29 434.32,419.04 437.40,421.71 440.48,423.21 443.56,423.78 446.64,423.72 449.73,423.32 452.81,422.80 455.89,422.15 458.97,421.23 462.05,419.90 465.13,418.02 468.21,415.52 471.29,412.62 474.37,409.60 477.45,406.72 480.53,404.21 483.61,402.19 486.70,400.58 489.78,399.27 492.86,398.13 495.94,397.07 499.02,396.14 502.10,395.55 505.18,395.50 508.26,396.18 511.34,397.72 514.42,399.95 517.50,402.51 520.58,405.10 523.66,407.40 526.75,409.22 529.83,410.66 532.91,411.91 535.99,413.14 539.07,414.54 542.15,416.13 545.23,417.76 548.31,419.21 551.39,420.30 554.47,420.88 557.55,421.05 560.63,421.17 563.72,421.57 566.80,422.58 569.88,424.46 572.96,427.07 576.04,430.10 579.12,433.25 582.20,436.23 585.28,438.82 588.36,441.03 591.44,442.90 594.52,444.50 597.60,445.87 600.68,447.06 603.77,448.01 606.85,448.68 609.93,449.02 613.01,448.99 616.09,448.60 619.17,447.90 622.25,446.93 625.33,445.75 628.41,444.40 631.49,442.99 634.57,441.67 637.65,440.54 640.74,439.73 643.82,439.31 646.90,439.28 649.98,439.64 653.06,440.36 656.14,441.42 659.22,442.72 662.30,444.00 665.38,445.03 668.46,445.56 671.54,445.41 674.62,444.58 677.70,443.25 680.79,441.63 683.87,439.90 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,80.84 73.87,81.79 76.95,83.81 80.03,86.51 83.11,89.50 86.19,92.43 89.27,95.10 92.35,97.57 95.43,99.88 98.51,102.09 101.59,104.28 104.68,106.51 107.76,108.88 110.84,111.45 113.92,114.29 117.00,117.42 120.08,120.70 123.16,123.96 126.24,127.01 129.32,129.70 132.40,131.99 135.48,134.04 138.56,136.04 141.65,138.16 144.73,140.57 147.81,143.22 150.89,145.82 153.97,148.10 157.05,149.79 160.13,150.71 163.21,150.94 166.29,150.75 169.37,150.42 172.45,150.19 175.53,150.27 178.61,150.79 181.70,151.82 184.78,153.45 187.86,155.72 190.94,158.68 194.02,162.36 197.10,166.76 200.18,171.93 203.26,177.84 206.34,184.32 209.42,190.95 212.50,197.35 215.58,203.16 218.67,208.10 221.75,212.31 224.83,216.16 227.91,220.01 230.99,224.21 234.07,228.99 237.15,234.28 240.23,239.92 243.31,245.73 246.39,251.57 249.47,257.32 252.55,262.95 255.63,268.45 258.72,273.82 261.80,279.05 264.88,284.08 267.96,288.82 271.04,293.14 274.12,296.97 277.20,300.24 280.28,303.18 283.36,306.15 286.44,309.51 289.52,313.58 292.60,318.53 295.69,324.07 298.77,329.78 301.85,335.26 304.93,340.14 308.01,344.22 311.09,347.59 314.17,350.40 317.25,352.78 320.33,354.87 323.41,356.77 326.49,358.52 329.57,360.16 332.66,361.72 335.74,363.22 338.82,364.75 341.90,366.40 344.98,368.26 348.06,370.42 351.14,372.93 354.22,375.74 357.30,378.79 360.38,382.02 363.46,385.36 366.54,388.72 369.62,391.95 372.71,394.89 375.79,397.41 378.87,399.38 381.95,400.81 385.03,401.83 388.11,402.54 391.19,403.07 394.27,403.52 397.35,403.84 400.43,403.96 403.51,403.77 406.59,403.17 409.68,402.17 412.76,400.99 415.84,399.95 418.92,399.34 422.00,399.41 425.08,400.24 428.16,401.54 431.24,403.03 434.32,404.40 437.40,405.41 440.48,406.03 443.56,406.49 446.64,407.04 449.73,407.89 452.81,409.22 455.89,410.91 458.97,412.71 462.05,414.37 465.13,415.63 468.21,416.33 471.29,416.42 474.37,415.91 477.45,414.83 480.53,413.20 483.61,411.14 486.70,408.92 489.78,406.84 492.86,405.14 495.94,404.07 499.02,403.69 502.10,403.94 505.18,404.72 508.26,405.96 511.34,407.56 514.42,409.33 517.50,411.04 520.58,412.49 523.66,413.50 526.75,413.94 529.83,413.91 532.91,413.55 535.99,412.98 539.07,412.34 542.15,411.79 545.23,411.51 548.31,411.71 551.39,412.56 554.47,414.19 557.55,416.52 560.63,419.30 563.72,422.26 566.80,425.14 569.88,427.73 572.96,429.99 576.04,431.94 579.12,433.63 582.20,435.09 585.28,436.38 588.36,437.59 591.44,438.80 594.52,440.10 597.60,441.54 600.68,443.16 603.77,444.93 606.85,446.80 609.93,448.75 613.01,450.71 616.09,452.60 619.17,454.27 622.25,455.56 625.33,456.34 628.41,456.53 631.49,456.26 634.57,455.73 637.65,455.17 640.74,454.76 643.82,454.66 646.90,454.88 649.98,455.37 653.06,456.11 656.14,457.05 659.22,458.15 662.30,459.35 665.38,460.62 668.46,461.90 671.54,463.16 674.62,464.42 677.70,465.77 680.79,467.28 683.87,469.02 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,80.32 73.87,81.16 76.95,83.01 80.03,85.62 83.11,88.71 86.19,92.02 89.27,95.43 92.35,98.96 95.43,102.65 98.51,106.54 101.59,110.65 104.68,114.89 107.76,119.06 110.84,122.99 113.92,126.51 117.00,129.54 120.08,132.18 123.16,134.61 126.24,137.01 129.32,139.53 132.40,142.21 135.48,144.86 138.56,147.27 141.65,149.24 144.73,150.59 147.81,151.31 150.89,151.58 153.97,151.59 157.05,151.53 160.13,151.55 163.21,151.79 166.29,152.36 169.37,153.34 172.45,154.81 175.53,156.78 178.61,159.03 181.70,161.27 184.78,163.22 187.86,164.64 190.94,165.52 194.02,166.29 197.10,167.42 200.18,169.35 203.26,172.48 206.34,176.88 209.42,182.34 212.50,188.58 215.58,195.37 218.67,202.47 221.75,209.61 224.83,216.50 227.91,222.91 230.99,228.61 234.07,233.46 237.15,237.56 240.23,241.09 243.31,244.20 246.39,247.06 249.47,249.82 252.55,252.62 255.63,255.59 258.72,258.84 261.80,262.46 264.88,266.46 267.96,270.75 271.04,275.24 274.12,279.85 277.20,284.51 280.28,289.34 283.36,294.55 286.44,300.36 289.52,306.95 292.60,314.40 295.69,322.37 298.77,330.44 301.85,338.20 304.93,345.29 308.01,351.45 311.09,356.68 314.17,360.98 317.25,364.40 320.33,366.97 323.41,368.75 326.49,369.84 329.57,370.32 332.66,370.26 335.74,369.74 338.82,368.94 341.90,368.08 344.98,367.39 348.06,367.03 351.14,367.12 354.22,367.55 357.30,368.12 360.38,368.66 363.46,369.00 366.54,369.12 369.62,369.24 372.71,369.62 375.79,370.48 378.87,372.04 381.95,374.34 385.03,377.28 388.11,380.71 391.19,384.53 394.27,388.61 397.35,392.86 400.43,397.19 403.51,401.52 406.59,405.79 409.68,409.95 412.76,414.05 415.84,418.15 418.92,422.32 422.00,426.60 425.08,430.92 428.16,434.93 431.24,438.29 434.32,440.67 437.40,441.78 440.48,441.54 443.56,440.11 446.64,437.62 449.73,434.24 452.81,430.12 455.89,425.58 458.97,421.00 462.05,416.72 465.13,413.04 468.21,410.19 471.29,408.09 474.37,406.63 477.45,405.66 480.53,405.05 483.61,404.62 486.70,404.14 489.78,403.40 492.86,402.20 495.94,400.36 499.02,398.09 502.10,395.93 505.18,394.41 508.26,394.00 511.34,395.10 514.42,397.65 517.50,401.36 520.58,405.96 523.66,411.16 526.75,416.66 529.83,422.03 532.91,426.86 535.99,430.75 539.07,433.37 542.15,434.57 545.23,434.54 548.31,433.47 551.39,431.58 554.47,429.09 557.55,426.22 560.63,423.23 563.72,420.36 566.80,417.79 569.88,415.72 572.96,414.22 576.04,413.34 579.12,413.09 582.20,413.49 585.28,414.53 588.36,416.06 591.44,417.95 594.52,420.05 597.60,422.24 600.68,424.43 603.77,426.58 606.85,428.69 609.93,430.73 613.01,432.69 616.09,434.50 619.17,436.01 622.25,437.11 625.33,437.67 628.41,437.61 631.49,436.96 634.57,435.79 637.65,434.22 640.74,432.30 643.82,430.13 646.90,427.78 649.98,425.29 653.06,422.72 656.14,420.11 659.22,417.52 662.30,415.00 665.38,412.60 668.46,410.38 671.54,408.36 674.62,406.43 677.70,404.34 680.79,401.85 683.87,398.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,124.77 73.87,124.00 76.95,122.42 80.03,120.43 83.11,118.42 86.19,116.74 89.27,115.66 92.35,115.35 95.43,115.91 98.51,117.45 101.59,120.02 104.68,123.37 107.76,127.08 110.84,130.74 113.92,134.00 117.00,136.62 120.08,138.71 123.16,140.52 126.24,142.29 129.32,144.26 132.40,146.50 135.48,148.84 138.56,151.05 141.65,152.93 144.73,154.28 147.81,155.03 150.89,155.21 153.97,154.87 157.05,154.07 160.13,152.87 163.21,151.54 166.29,150.45 169.37,149.95 172.45,150.35 175.53,151.86 178.61,154.40 181.70,157.79 184.78,161.85 187.86,166.42 190.94,171.38 194.02,176.76 197.10,182.58 200.18,188.88 203.26,195.68 206.34,202.70 209.42,209.34 212.50,215.00 215.58,219.16 218.67,221.40 221.75,222.06 224.83,221.84 227.91,221.43 230.99,221.49 234.07,222.50 237.15,224.43 240.23,227.13 243.31,230.39 246.39,234.04 249.47,238.02 252.55,242.55 255.63,247.84 258.72,254.14 261.80,261.62 264.88,270.13 267.96,279.14 271.04,288.15 274.12,296.68 277.20,304.33 280.28,310.98 283.36,316.65 286.44,321.40 289.52,325.29 292.60,328.40 295.69,330.90 298.77,332.95 301.85,334.72 304.93,336.33 308.01,337.90 311.09,339.48 314.17,341.10 317.25,342.78 320.33,344.55 323.41,346.40 326.49,348.36 329.57,350.42 332.66,352.59 335.74,354.86 338.82,357.13 341.90,359.28 344.98,361.16 348.06,362.67 351.14,363.74 354.22,364.43 357.30,364.83 360.38,365.04 363.46,365.14 366.54,365.27 369.62,365.59 372.71,366.29 375.79,367.50 378.87,369.38 381.95,371.98 385.03,375.26 388.11,379.20 391.19,383.76 394.27,388.90 397.35,394.49 400.43,400.39 403.51,406.46 406.59,412.56 409.68,418.56 412.76,424.25 415.84,429.38 418.92,433.76 422.00,437.19 425.08,439.60 428.16,441.05 431.24,441.64 434.32,441.46 437.40,440.60 440.48,439.21 443.56,437.49 446.64,435.63 449.73,433.78 452.81,432.09 455.89,430.52 458.97,428.99 462.05,427.39 465.13,425.63 468.21,423.60 471.29,421.26 474.37,418.53 477.45,415.37 480.53,411.73 483.61,407.64 486.70,403.23 489.78,398.63 492.86,393.99 495.94,389.42 499.02,385.11 502.10,381.31 505.18,378.24 508.26,376.10 511.34,375.05 514.42,375.04 517.50,375.90 520.58,377.47 523.66,379.62 526.75,382.20 529.83,385.20 532.91,388.59 535.99,392.39 539.07,396.59 542.15,401.15 545.23,405.90 548.31,410.71 551.39,415.44 554.47,419.96 557.55,424.16 560.63,427.96 563.72,431.27 566.80,434.03 569.88,436.19 572.96,437.91 576.04,439.39 579.12,440.86 582.20,442.49 585.28,444.45 588.36,446.77 591.44,449.45 594.52,452.48 597.60,455.84 600.68,459.40 603.77,462.77 606.85,465.60 609.93,467.53 613.01,468.26 616.09,467.79 619.17,466.36 622.25,464.23 625.33,461.63 628.41,458.80 631.49,455.86 634.57,452.90 637.65,449.98 640.74,447.17 643.82,444.47 646.90,441.82 649.98,439.12 653.06,436.29 656.14,433.24 659.22,429.98 662.30,426.70 665.38,423.57 668.46,420.77 671.54,418.45 674.62,416.65 677.70,415.31 680.79,414.35 683.87,413.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,101.30 73.87,100.88 76.95,100.13 80.03,99.38 83.11,98.94 86.19,99.12 89.27,100.11 92.35,101.99 95.43,104.84 98.51,108.68 101.59,113.54 104.68,119.15 107.76,125.09 110.84,130.97 113.92,136.44 117.00,141.20 120.08,145.05 123.16,147.83 126.24,149.43 129.32,149.74 132.40,148.83 135.48,147.07 138.56,144.87 141.65,142.60 144.73,140.59 147.81,139.14 150.89,138.44 153.97,138.68 157.05,140.01 160.13,142.51 163.21,145.86 166.29,149.51 169.37,152.93 172.45,155.66 175.53,157.41 178.61,158.54 181.70,159.59 184.78,161.06 187.86,163.46 190.94,166.94 194.02,171.15 197.10,175.64 200.18,179.97 203.26,183.78 206.34,186.98 209.42,189.83 212.50,192.59 215.58,195.52 218.67,198.85 221.75,202.76 224.83,207.36 227.91,212.76 230.99,219.04 234.07,226.19 237.15,233.89 240.23,241.72 243.31,249.32 246.39,256.32 249.47,262.54 252.55,268.08 255.63,273.06 258.72,277.64 261.80,281.93 264.88,286.01 267.96,289.88 271.04,293.52 274.12,296.94 277.20,300.11 280.28,303.11 283.36,306.05 286.44,309.03 289.52,312.12 292.60,315.41 295.69,318.87 298.77,322.49 301.85,326.25 304.93,330.10 308.01,333.94 311.09,337.50 314.17,340.49 317.25,342.66 320.33,343.78 323.41,343.96 326.49,343.55 329.57,342.96 332.66,342.53 335.74,342.59 338.82,343.38 341.90,345.07 344.98,347.83 348.06,351.77 351.14,356.89 354.22,362.76 357.30,368.84 360.38,374.62 363.46,379.65 366.54,383.66 369.62,386.74 372.71,389.04 375.79,390.71 378.87,391.90 381.95,392.88 385.03,394.04 388.11,395.72 391.19,398.26 394.27,401.89 397.35,406.39 400.43,411.31 403.51,416.22 406.59,420.69 409.68,424.42 412.76,427.29 415.84,429.28 418.92,430.39 422.00,430.63 425.08,430.12 428.16,429.23 431.24,428.36 434.32,427.84 437.40,427.97 440.48,428.75 443.56,429.83 446.64,430.88 449.73,431.58 452.81,431.64 455.89,431.05 458.97,429.88 462.05,428.24 465.13,426.23 468.21,423.92 471.29,421.24 474.37,418.14 477.45,414.51 480.53,410.31 483.61,405.62 486.70,400.86 489.78,396.44 492.86,392.76 495.94,390.16 499.02,388.70 502.10,388.18 505.18,388.36 508.26,389.04 511.34,390.02 514.42,391.24 517.50,392.73 520.58,394.50 523.66,396.57 526.75,398.94 529.83,401.45 532.91,403.93 535.99,406.21 539.07,408.15 542.15,409.68 545.23,410.87 548.31,411.80 551.39,412.57 554.47,413.24 557.55,413.98 560.63,415.02 563.72,416.56 566.80,418.79 569.88,421.84 572.96,425.45 576.04,429.23 579.12,432.77 582.20,435.70 585.28,437.82 588.36,439.29 591.44,440.41 594.52,441.45 597.60,442.69 600.68,444.22 603.77,445.93 606.85,447.66 609.93,449.26 613.01,450.57 616.09,451.49 619.17,451.91 622.25,451.74 625.33,450.92 628.41,449.39 631.49,447.36 634.57,445.07 637.65,442.80 640.74,440.78 643.82,439.20 646.90,438.15 649.98,437.67 653.06,437.78 656.14,438.51 659.22,439.69 662.30,440.87 665.38,441.59 668.46,441.43 671.54,440.02 674.62,437.50 677.70,434.45 680.79,431.42 683.87,428.97 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,207.07 73.87,205.43 76.95,202.19 80.03,198.27 83.11,194.62 86.19,192.08 89.27,190.89 92.35,190.63 95.43,190.79 98.51,190.91 101.59,190.56 104.68,189.53 107.76,187.71 110.84,185.06 113.92,181.51 117.00,177.12 120.08,172.23 123.16,167.27 126.24,162.63 129.32,158.69 132.40,155.59 135.48,153.14 138.56,151.06 141.65,149.11 144.73,147.05 147.81,144.87 150.89,142.78 153.97,141.01 157.05,139.77 160.13,139.25 163.21,139.49 166.29,140.49 169.37,142.21 172.45,144.62 175.53,147.70 178.61,151.45 181.70,155.87 184.78,160.97 187.86,166.76 190.94,173.12 194.02,179.71 197.10,186.16 200.18,192.14 203.26,197.37 206.34,201.62 209.42,204.78 212.50,206.75 215.58,207.44 218.67,206.85 221.75,205.44 224.83,203.88 227.91,202.83 230.99,202.89 234.07,204.50 237.15,207.70 240.23,212.41 243.31,218.51 246.39,225.87 249.47,234.30 252.55,243.38 255.63,252.70 258.72,261.92 261.80,270.70 264.88,278.96 267.96,286.84 271.04,294.51 274.12,302.12 277.20,309.77 280.28,317.13 283.36,323.63 286.44,328.71 289.52,331.88 292.60,332.88 295.69,332.27 298.77,330.78 301.85,329.16 304.93,328.07 308.01,327.91 311.09,328.67 314.17,330.23 317.25,332.46 320.33,335.22 323.41,338.31 326.49,341.40 329.57,344.22 332.66,346.50 335.74,348.04 338.82,349.07 341.90,349.97 344.98,351.14 348.06,352.95 351.14,355.63 354.22,358.98 357.30,362.69 360.38,366.46 363.46,370.00 366.54,373.21 369.62,376.29 372.71,379.49 375.79,383.03 378.87,387.14 381.95,391.85 385.03,397.04 388.11,402.56 391.19,408.28 394.27,414.07 397.35,419.65 400.43,424.71 403.51,428.94 406.59,432.07 409.68,433.97 412.76,434.90 415.84,435.23 418.92,435.31 422.00,435.48 425.08,435.88 428.16,436.38 431.24,436.80 434.32,436.96 437.40,436.69 440.48,435.84 443.56,434.26 446.64,431.84 449.73,428.45 452.81,424.06 455.89,418.95 458.97,413.57 462.05,408.37 465.13,403.74 468.21,399.95 471.29,396.86 474.37,394.25 477.45,391.86 480.53,389.49 483.61,387.07 486.70,384.86 489.78,383.14 492.86,382.17 495.94,382.20 499.02,383.16 502.10,384.76 505.18,386.67 508.26,388.62 511.34,390.35 514.42,391.93 517.50,393.56 520.58,395.44 523.66,397.76 526.75,400.63 529.83,403.89 532.91,407.31 535.99,410.70 539.07,413.85 542.15,416.65 545.23,419.08 548.31,421.17 551.39,422.93 554.47,424.40 557.55,425.62 560.63,426.66 563.72,427.61 566.80,428.52 569.88,429.45 572.96,430.37 576.04,431.24 579.12,432.00 582.20,432.62 585.28,433.08 588.36,433.45 591.44,433.85 594.52,434.36 597.60,435.08 600.68,436.12 603.77,437.59 606.85,439.63 609.93,442.34 613.01,445.81 616.09,449.88 619.17,454.17 622.25,458.33 625.33,462.02 628.41,464.96 631.49,467.11 634.57,468.58 637.65,469.46 640.74,469.85 643.82,469.83 646.90,469.44 649.98,468.68 653.06,467.58 656.14,466.15 659.22,464.41 662.30,462.48 665.38,460.45 668.46,458.42 671.54,456.46 674.62,454.56 677.70,452.58 680.79,450.43 683.87,447.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,122.44 73.87,122.51 76.95,122.72 80.03,123.16 83.11,123.87 86.19,124.90 89.27,126.26 92.35,127.94 95.43,129.89 98.51,132.11 101.59,134.54 104.68,137.18 107.76,139.99 110.84,142.95 113.92,146.04 117.00,149.17 120.08,151.97 123.16,154.03 126.24,154.94 129.32,154.36 132.40,152.19 135.48,148.88 138.56,144.93 141.65,140.81 144.73,136.96 147.81,133.69 150.89,131.17 153.97,129.54 157.05,128.93 160.13,129.40 163.21,130.80 166.29,132.88 169.37,135.38 172.45,138.08 175.53,140.79 178.61,143.58 181.70,146.55 184.78,149.79 187.86,153.43 190.94,157.51 194.02,162.00 197.10,166.83 200.18,171.96 203.26,177.34 206.34,182.97 209.42,188.88 212.50,195.14 215.58,201.79 218.67,208.83 221.75,216.12 224.83,223.37 227.91,230.34 230.99,236.79 234.07,242.55 237.15,247.66 240.23,252.17 243.31,256.17 246.39,259.74 249.47,263.00 252.55,266.10 255.63,269.24 258.72,272.55 261.80,276.17 264.88,280.20 267.96,284.70 271.04,289.70 274.12,295.23 277.20,301.30 280.28,307.60 283.36,313.69 286.44,319.14 289.52,323.58 292.60,326.74 295.69,328.68 298.77,329.56 301.85,329.57 304.93,328.87 308.01,327.71 311.09,326.54 314.17,325.79 317.25,325.87 320.33,327.12 323.41,329.59 326.49,333.03 329.57,337.18 332.66,341.80 335.74,346.65 338.82,351.46 341.90,355.98 344.98,359.98 348.06,363.26 351.14,365.72 354.22,367.57 357.30,369.13 360.38,370.67 363.46,372.47 366.54,374.65 369.62,377.13 372.71,379.75 375.79,382.39 378.87,384.91 381.95,387.28 385.03,389.54 388.11,391.75 391.19,393.96 394.27,396.22 397.35,398.60 400.43,401.21 403.51,404.12 406.59,407.40 409.68,411.09 412.76,415.12 415.84,419.39 418.92,423.82 422.00,428.31 425.08,432.69 428.16,436.60 431.24,439.69 434.32,441.65 437.40,442.20 440.48,441.38 443.56,439.49 446.64,436.87 449.73,433.82 452.81,430.61 455.89,427.25 458.97,423.60 462.05,419.56 465.13,414.99 468.21,409.87 471.29,404.61 474.37,399.67 477.45,395.50 480.53,392.50 483.61,390.85 486.70,390.39 489.78,390.91 492.86,392.18 495.94,394.01 499.02,396.13 502.10,398.27 505.18,400.15 508.26,401.53 511.34,402.25 514.42,402.41 517.50,402.28 520.58,402.11 523.66,402.13 526.75,402.51 529.83,403.16 532.91,403.93 535.99,404.67 539.07,405.26 542.15,405.69 545.23,406.17 548.31,406.96 551.39,408.28 554.47,410.32 557.55,413.02 560.63,416.06 563.72,419.14 566.80,421.97 569.88,424.32 572.96,426.32 576.04,428.26 579.12,430.42 582.20,433.07 585.28,436.35 588.36,440.05 591.44,443.87 594.52,447.50 597.60,450.70 600.68,453.32 603.77,455.45 606.85,457.21 609.93,458.73 613.01,460.11 616.09,461.35 619.17,462.34 622.25,462.96 625.33,463.13 628.41,462.74 631.49,461.87 634.57,460.61 637.65,459.09 640.74,457.40 643.82,455.59 646.90,453.58 649.98,451.25 653.06,448.46 656.14,445.13 659.22,441.35 662.30,437.65 665.38,434.52 668.46,432.45 671.54,431.84 674.62,432.63 677.70,434.32 680.79,436.42 683.87,438.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,164.35 73.87,164.35 76.95,164.21 80.03,163.79 83.11,162.93 86.19,161.50 89.27,159.52 92.35,157.13 95.43,154.46 98.51,151.66 101.59,148.87 104.68,146.24 107.76,143.95 110.84,142.14 113.92,140.96 117.00,140.48 120.08,140.50 123.16,140.79 126.24,141.11 129.32,141.25 132.40,141.14 135.48,140.95 138.56,140.90 141.65,141.21 144.73,142.05 147.81,143.51 150.89,145.57 153.97,148.20 157.05,151.35 160.13,154.97 163.21,158.66 166.29,161.91 169.37,164.21 172.45,165.13 175.53,164.39 178.61,162.34 181.70,159.49 184.78,156.33 187.86,153.32 190.94,150.86 194.02,149.26 197.10,148.80 200.18,149.69 203.26,152.14 206.34,156.18 209.42,161.73 212.50,168.68 215.58,176.93 218.67,186.33 221.75,196.46 224.83,206.71 227.91,216.55 230.99,225.48 234.07,233.14 237.15,239.53 240.23,244.78 243.31,249.01 246.39,252.36 249.47,255.02 252.55,257.28 255.63,259.44 258.72,261.78 261.80,264.50 264.88,267.74 267.96,271.47 271.04,275.67 274.12,280.29 277.20,285.32 280.28,290.85 283.36,297.05 286.44,304.08 289.52,312.09 292.60,321.07 295.69,330.43 298.77,339.48 301.85,347.55 304.93,354.03 308.01,358.64 311.09,361.64 314.17,363.37 317.25,364.17 320.33,364.36 323.41,364.21 326.49,363.95 329.57,363.76 332.66,363.82 335.74,364.23 338.82,364.94 341.90,365.76 344.98,366.53 348.06,367.07 351.14,367.30 354.22,367.34 357.30,367.35 360.38,367.51 363.46,367.97 366.54,368.84 369.62,370.10 372.71,371.70 375.79,373.62 378.87,375.81 381.95,378.17 385.03,380.52 388.11,382.70 391.19,384.55 394.27,386.01 397.35,387.42 400.43,389.36 403.51,392.38 406.59,396.96 409.68,403.41 412.76,411.33 415.84,420.15 418.92,429.32 422.00,438.34 425.08,446.77 428.16,454.26 431.24,460.51 434.32,465.26 437.40,468.30 440.48,469.57 443.56,469.14 446.64,467.12 449.73,463.61 452.81,458.72 455.89,452.68 458.97,445.77 462.05,438.25 465.13,430.35 468.21,422.30 471.29,414.37 474.37,406.82 477.45,399.87 480.53,393.73 483.61,388.53 486.70,384.26 489.78,380.92 492.86,378.48 495.94,376.91 499.02,376.19 502.10,376.28 505.18,377.16 508.26,378.80 511.34,381.17 514.42,384.12 517.50,387.50 520.58,391.11 523.66,394.83 526.75,398.51 529.83,402.09 532.91,405.52 535.99,408.76 539.07,411.77 542.15,414.50 545.23,416.87 548.31,418.80 551.39,420.22 554.47,421.06 557.55,421.43 560.63,421.53 563.72,421.58 566.80,421.79 569.88,422.31 572.96,423.16 576.04,424.32 579.12,425.72 582.20,427.32 585.28,429.08 588.36,430.97 591.44,433.01 594.52,435.20 597.60,437.53 600.68,439.95 603.77,442.30 606.85,444.42 609.93,446.16 613.01,447.39 616.09,448.08 619.17,448.27 622.25,448.01 625.33,447.34 628.41,446.32 631.49,445.02 634.57,443.53 637.65,441.92 640.74,440.25 643.82,438.57 646.90,436.85 649.98,435.06 653.06,433.15 656.14,431.09 659.22,428.88 662.30,426.60 665.38,424.34 668.46,422.17 671.54,420.16 674.62,418.41 677.70,417.01 680.79,416.04 683.87,415.58 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,65.56 73.87,66.38 76.95,68.42 80.03,71.68 83.11,76.17 86.19,81.83 89.27,88.48 92.35,95.79 95.43,103.41 98.51,111.06 101.59,118.44 104.68,125.36 107.76,131.64 110.84,137.14 113.92,141.72 117.00,145.30 120.08,147.85 123.16,149.39 126.24,149.92 129.32,149.46 132.40,148.11 135.48,146.18 138.56,143.98 141.65,141.80 144.73,139.88 147.81,138.32 150.89,137.04 153.97,135.94 157.05,134.92 160.13,133.92 163.21,133.16 166.29,133.03 169.37,133.86 172.45,136.00 175.53,139.62 178.61,144.49 181.70,150.23 184.78,156.48 187.86,162.91 190.94,169.28 194.02,175.43 197.10,181.27 200.18,186.72 203.26,191.71 206.34,196.22 209.42,200.24 212.50,203.79 215.58,206.87 218.67,209.51 221.75,211.95 224.83,214.51 227.91,217.51 230.99,221.23 234.07,225.83 237.15,231.12 240.23,236.80 243.31,242.60 246.39,248.24 249.47,253.55 252.55,258.53 255.63,263.21 258.72,267.63 261.80,271.81 264.88,275.86 267.96,279.88 271.04,284.01 274.12,288.35 277.20,292.98 280.28,297.93 283.36,303.14 286.44,308.59 289.52,314.23 292.60,320.00 295.69,325.67 298.77,331.03 301.85,335.84 304.93,339.92 308.01,343.22 311.09,345.94 314.17,348.32 317.25,350.58 320.33,352.95 323.41,355.42 326.49,357.86 329.57,360.09 332.66,361.96 335.74,363.33 338.82,364.34 341.90,365.21 344.98,366.18 348.06,367.47 351.14,369.22 354.22,371.38 357.30,373.88 360.38,376.59 363.46,379.43 366.54,382.26 369.62,384.87 372.71,387.03 375.79,388.57 378.87,389.31 381.95,389.37 385.03,389.12 388.11,388.93 391.19,389.14 394.27,390.04 397.35,391.79 400.43,394.43 403.51,397.99 406.59,402.49 409.68,407.87 412.76,413.79 415.84,419.88 418.92,425.77 422.00,431.13 425.08,435.74 428.16,439.50 431.24,442.37 434.32,444.31 437.40,445.30 440.48,445.34 443.56,444.41 446.64,442.50 449.73,439.63 452.81,435.80 455.89,431.13 458.97,425.78 462.05,419.91 465.13,413.64 468.21,407.17 471.29,400.87 474.37,395.14 477.45,390.34 480.53,386.81 483.61,384.64 486.70,383.55 489.78,383.25 492.86,383.40 495.94,383.76 499.02,384.31 502.10,385.33 505.18,387.09 508.26,389.84 511.34,393.77 514.42,398.41 517.50,403.04 520.58,406.98 523.66,409.58 526.75,410.46 529.83,410.02 532.91,408.85 535.99,407.51 539.07,406.55 542.15,406.35 545.23,407.13 548.31,409.03 551.39,412.17 554.47,416.63 557.55,422.16 560.63,428.18 563.72,434.16 566.80,439.59 569.88,444.08 572.96,447.64 576.04,450.52 579.12,452.96 582.20,455.22 585.28,457.43 588.36,459.45 591.44,461.06 594.52,462.03 597.60,462.18 600.68,461.50 603.77,460.31 606.85,458.96 609.93,457.78 613.01,457.05 616.09,456.72 619.17,456.48 622.25,455.96 625.33,454.87 628.41,452.95 631.49,450.29 634.57,447.15 637.65,443.78 640.74,440.43 643.82,437.28 646.90,434.38 649.98,431.74 653.06,429.34 656.14,427.17 659.22,425.23 662.30,423.48 665.38,421.91 668.46,420.49 671.54,419.20 674.62,417.97 677.70,416.66 680.79,415.14 683.87,413.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,68.70 73.87,68.42 76.95,68.07 80.03,68.06 83.11,68.81 86.19,70.65 89.27,73.71 92.35,77.87 95.43,82.98 98.51,88.87 101.59,95.40 104.68,102.32 107.76,109.31 110.84,116.10 113.92,122.45 117.00,128.15 120.08,133.13 123.16,137.33 126.24,140.74 129.32,143.32 132.40,145.12 135.48,146.33 138.56,147.13 141.65,147.68 144.73,148.14 147.81,148.66 150.89,149.38 153.97,150.45 157.05,151.97 160.13,154.01 163.21,156.33 166.29,158.54 169.37,160.27 172.45,161.17 175.53,161.04 178.61,160.15 181.70,158.90 184.78,157.68 187.86,156.86 190.94,156.76 194.02,157.73 197.10,160.04 200.18,163.96 203.26,169.69 206.34,177.03 209.42,185.40 212.50,194.19 215.58,202.87 218.67,210.95 221.75,218.27 224.83,224.81 227.91,230.59 230.99,235.63 234.07,240.02 237.15,243.95 240.23,247.62 243.31,251.24 246.39,254.99 249.47,258.95 252.55,263.06 255.63,267.20 258.72,271.27 261.80,275.18 264.88,278.97 267.96,282.83 271.04,286.94 274.12,291.47 277.20,296.53 280.28,301.92 283.36,307.23 286.44,312.09 289.52,316.15 292.60,319.22 295.69,321.66 298.77,323.95 301.85,326.55 304.93,329.90 308.01,334.13 311.09,338.81 314.17,343.45 317.25,347.58 320.33,350.80 323.41,352.95 326.49,354.22 329.57,354.77 332.66,354.79 335.74,354.46 338.82,354.07 341.90,353.92 344.98,354.32 348.06,355.50 351.14,357.64 354.22,360.54 357.30,363.96 360.38,367.64 363.46,371.34 366.54,374.93 369.62,378.42 372.71,381.88 375.79,385.36 378.87,388.90 381.95,392.55 385.03,396.31 388.11,400.17 391.19,404.14 394.27,408.20 397.35,412.21 400.43,415.96 403.51,419.26 406.59,421.93 409.68,423.89 412.76,425.35 415.84,426.57 418.92,427.82 422.00,429.36 425.08,431.20 428.16,433.03 431.24,434.48 434.32,435.20 437.40,434.88 440.48,433.50 443.56,431.30 446.64,428.53 449.73,425.45 452.81,422.25 455.89,418.99 458.97,415.65 462.05,412.16 465.13,408.50 468.21,404.66 471.29,400.87 474.37,397.36 477.45,394.38 480.53,392.14 483.61,390.72 486.70,390.04 489.78,389.95 492.86,390.34 495.94,391.08 499.02,392.05 502.10,393.11 505.18,394.14 508.26,395.05 511.34,395.74 514.42,396.33 517.50,396.98 520.58,397.86 523.66,399.11 526.75,400.85 529.83,402.97 532.91,405.36 535.99,407.88 539.07,410.42 542.15,412.89 545.23,415.25 548.31,417.48 551.39,419.57 554.47,421.50 557.55,423.28 560.63,424.97 563.72,426.60 566.80,428.20 569.88,429.82 572.96,431.49 576.04,433.24 579.12,435.08 582.20,437.05 585.28,439.11 588.36,441.09 591.44,442.79 594.52,444.03 597.60,444.64 600.68,444.59 603.77,444.10 606.85,443.42 609.93,442.76 613.01,442.32 616.09,442.11 619.17,441.95 622.25,441.64 625.33,441.01 628.41,439.92 631.49,438.46 634.57,436.79 637.65,435.11 640.74,433.56 643.82,432.27 646.90,431.18 649.98,430.22 653.06,429.30 656.14,428.33 659.22,427.28 662.30,426.15 665.38,424.94 668.46,423.67 671.54,422.37 674.62,421.07 677.70,419.86 680.79,418.82 683.87,418.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,130.64 73.87,130.94 76.95,131.51 80.03,132.14 83.11,132.61 86.19,132.74 89.27,132.46 92.35,131.82 95.43,130.91 98.51,129.79 101.59,128.53 104.68,127.27 107.76,126.19 110.84,125.44 113.92,125.16 117.00,125.44 120.08,126.18 123.16,127.27 126.24,128.57 129.32,129.95 132.40,131.35 135.48,132.79 138.56,134.29 141.65,135.91 144.73,137.67 147.81,139.56 150.89,141.54 153.97,143.55 157.05,145.54 160.13,147.49 163.21,149.52 166.29,151.87 169.37,154.73 172.45,158.30 175.53,162.68 178.61,167.62 181.70,172.76 184.78,177.80 187.86,182.43 190.94,186.51 194.02,190.12 197.10,193.43 200.18,196.56 203.26,199.65 206.34,202.75 209.42,205.82 212.50,208.81 215.58,211.67 218.67,214.36 221.75,216.95 224.83,219.56 227.91,222.32 230.99,225.31 234.07,228.61 237.15,232.03 240.23,235.39 243.31,238.47 246.39,241.09 249.47,243.25 252.55,245.26 255.63,247.46 258.72,250.18 261.80,253.71 264.88,258.07 267.96,263.03 271.04,268.34 274.12,273.76 277.20,279.08 280.28,284.22 283.36,289.15 286.44,293.86 289.52,298.37 292.60,302.68 295.69,306.84 298.77,310.92 301.85,314.96 304.93,319.01 308.01,323.13 311.09,327.32 314.17,331.61 317.25,336.00 320.33,340.51 323.41,345.07 326.49,349.56 329.57,353.85 332.66,357.84 335.74,361.44 338.82,364.73 341.90,367.91 344.98,371.13 348.06,374.56 351.14,378.31 354.22,382.33 357.30,386.52 360.38,390.79 363.46,395.04 366.54,399.17 369.62,403.03 372.71,406.48 375.79,409.39 378.87,411.64 381.95,413.29 385.03,414.49 388.11,415.43 391.19,416.26 394.27,417.12 397.35,417.96 400.43,418.65 403.51,419.05 406.59,419.02 409.68,418.53 412.76,417.80 415.84,417.12 418.92,416.77 422.00,417.00 425.08,417.88 428.16,419.10 431.24,420.32 434.32,421.24 437.40,421.58 440.48,421.30 443.56,420.65 446.64,419.86 449.73,419.17 452.81,418.75 455.89,418.63 458.97,418.72 462.05,418.92 465.13,419.15 468.21,419.30 471.29,419.18 474.37,418.61 477.45,417.42 480.53,415.44 483.61,412.68 486.70,409.38 489.78,405.82 492.86,402.26 495.94,398.93 499.02,396.04 502.10,393.72 505.18,392.12 508.26,391.34 511.34,391.46 514.42,392.33 517.50,393.71 520.58,395.36 523.66,397.08 526.75,398.70 529.83,400.19 532.91,401.59 535.99,402.94 539.07,404.25 542.15,405.59 545.23,407.02 548.31,408.62 551.39,410.44 554.47,412.54 557.55,414.96 560.63,417.72 563.72,420.81 566.80,424.26 569.88,428.05 572.96,432.04 576.04,436.04 579.12,439.87 582.20,443.37 585.28,446.42 588.36,449.03 591.44,451.28 594.52,453.20 597.60,454.87 600.68,456.31 603.77,457.52 606.85,458.48 609.93,459.17 613.01,459.60 616.09,459.71 619.17,459.50 622.25,458.92 625.33,457.94 628.41,456.53 631.49,454.65 634.57,452.21 637.65,449.15 640.74,445.42 643.82,441.05 646.90,436.43 649.98,431.99 653.06,428.13 656.14,425.21 659.22,423.34 662.30,422.22 665.38,421.51 668.46,420.87 671.54,420.01 674.62,418.82 677.70,417.41 680.79,415.86 683.87,414.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,156.34 73.87,156.81 76.95,157.74 80.03,158.88 83.11,159.97 86.19,160.76 89.27,161.05 92.35,160.71 95.43,159.59 98.51,157.60 101.59,154.66 104.68,151.03 107.76,147.11 110.84,143.29 113.92,139.93 117.00,137.28 120.08,135.33 123.16,133.95 126.24,133.02 129.32,132.42 132.40,132.13 135.48,132.41 138.56,133.52 141.65,135.73 144.73,139.24 147.81,143.86 150.89,148.97 153.97,153.95 157.05,158.24 160.13,161.38 163.21,163.46 166.29,164.88 169.37,166.04 172.45,167.32 175.53,169.03 178.61,171.17 181.70,173.68 184.78,176.48 187.86,179.48 190.94,182.63 194.02,185.96 197.10,189.48 200.18,193.22 203.26,197.19 206.34,201.33 209.42,205.44 212.50,209.32 215.58,212.83 218.67,215.82 221.75,218.41 224.83,220.86 227.91,223.39 230.99,226.23 234.07,229.52 237.15,233.20 240.23,237.12 243.31,241.12 246.39,245.08 249.47,248.93 252.55,252.71 255.63,256.48 258.72,260.30 261.80,264.24 264.88,268.26 267.96,272.27 271.04,276.16 274.12,279.84 277.20,283.23 280.28,286.50 283.36,289.87 286.44,293.61 289.52,297.93 292.60,302.97 295.69,308.65 298.77,314.81 301.85,321.29 304.93,327.94 308.01,334.55 311.09,340.80 314.17,346.34 317.25,350.90 320.33,354.20 323.41,356.26 326.49,357.35 329.57,357.72 332.66,357.65 335.74,357.39 338.82,357.26 341.90,357.62 344.98,358.80 348.06,361.08 351.14,364.59 354.22,368.91 357.30,373.50 360.38,377.85 363.46,381.49 366.54,384.19 369.62,386.10 372.71,387.47 375.79,388.52 378.87,389.49 381.95,390.52 385.03,391.71 388.11,393.15 391.19,394.89 394.27,396.98 397.35,399.47 400.43,402.37 403.51,405.69 406.59,409.45 409.68,413.63 412.76,418.10 415.84,422.75 418.92,427.43 422.00,432.03 425.08,436.40 428.16,440.25 431.24,443.32 434.32,445.38 437.40,446.22 440.48,445.93 443.56,444.87 446.64,443.40 449.73,441.84 452.81,440.47 455.89,439.13 458.97,437.45 462.05,435.08 465.13,431.68 468.21,427.06 471.29,421.54 474.37,415.53 477.45,409.43 480.53,403.62 483.61,398.35 486.70,393.63 489.78,389.44 492.86,385.76 495.94,382.54 499.02,379.85 502.10,377.82 505.18,376.60 508.26,376.30 511.34,377.01 514.42,378.53 517.50,380.57 520.58,382.82 523.66,385.01 526.75,386.96 529.83,388.76 532.91,390.54 535.99,392.46 539.07,394.66 542.15,397.24 545.23,400.23 548.31,403.66 551.39,407.54 554.47,411.87 557.55,416.63 560.63,421.72 563.72,427.09 566.80,432.65 569.88,438.33 572.96,443.97 576.04,449.35 579.12,454.29 582.20,458.60 585.28,462.18 588.36,465.00 591.44,467.08 594.52,468.46 597.60,469.14 600.68,469.12 603.77,468.28 606.85,466.48 609.93,463.63 613.01,459.63 616.09,454.60 619.17,448.85 622.25,442.68 625.33,436.36 628.41,430.15 631.49,424.31 634.57,419.08 637.65,414.67 640.74,411.26 643.82,408.97 646.90,407.80 649.98,407.69 653.06,408.59 656.14,410.44 659.22,413.14 662.30,416.52 665.38,420.40 668.46,424.63 671.54,429.07 674.62,433.57 677.70,438.01 680.79,442.26 683.87,446.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,190.37 73.87,189.91 76.95,188.72 80.03,186.69 83.11,183.76 86.19,179.87 89.27,175.16 92.35,169.98 95.43,164.65 98.51,159.50 101.59,154.77 104.68,150.52 107.76,146.66 110.84,143.10 113.92,139.75 117.00,136.58 120.08,133.80 123.16,131.72 126.24,130.61 129.32,130.71 132.40,132.04 135.48,134.21 138.56,136.75 141.65,139.24 144.73,141.30 147.81,142.84 150.89,144.03 153.97,145.09 157.05,146.24 160.13,147.65 163.21,149.40 166.29,151.47 169.37,153.85 172.45,156.53 175.53,159.49 178.61,162.75 181.70,166.37 184.78,170.37 187.86,174.78 190.94,179.58 194.02,184.63 197.10,189.81 200.18,194.97 203.26,200.01 206.34,204.81 209.42,209.29 212.50,213.36 215.58,216.97 218.67,220.06 221.75,222.74 224.83,225.20 227.91,227.60 230.99,230.11 234.07,232.85 237.15,235.78 240.23,238.86 243.31,242.00 246.39,245.16 249.47,248.31 252.55,251.54 255.63,254.94 258.72,258.60 261.80,262.59 264.88,266.96 267.96,271.67 271.04,276.73 274.12,282.10 277.20,287.78 280.28,293.74 283.36,299.99 286.44,306.53 289.52,313.36 292.60,320.43 295.69,327.54 298.77,334.43 301.85,340.88 304.93,346.69 308.01,351.71 311.09,355.90 314.17,359.24 317.25,361.71 320.33,363.32 323.41,364.14 326.49,364.29 329.57,363.90 332.66,363.09 335.74,361.97 338.82,360.69 341.90,359.40 344.98,358.25 348.06,357.36 351.14,356.85 354.22,356.86 357.30,357.52 360.38,358.95 363.46,361.24 366.54,364.40 369.62,368.23 372.71,372.53 375.79,377.10 378.87,381.75 381.95,386.34 385.03,390.71 388.11,394.75 391.19,398.35 394.27,401.45 397.35,404.19 400.43,406.83 403.51,409.62 406.59,412.78 409.68,416.47 412.76,420.57 415.84,424.90 418.92,429.26 422.00,433.50 425.08,437.42 428.16,440.78 431.24,443.35 434.32,444.91 437.40,445.31 440.48,444.50 443.56,442.61 446.64,439.75 449.73,436.05 452.81,431.64 455.89,426.79 458.97,421.82 462.05,417.04 465.13,412.71 468.21,409.01 471.29,405.80 474.37,402.87 477.45,400.01 480.53,397.02 483.61,393.84 486.70,390.65 489.78,387.66 492.86,385.06 495.94,383.02 499.02,381.60 502.10,380.72 505.18,380.32 508.26,380.33 511.34,380.67 514.42,381.32 517.50,382.28 520.58,383.54 523.66,385.11 526.75,386.98 529.83,389.17 532.91,391.68 535.99,394.51 539.07,397.68 542.15,401.21 545.23,405.18 548.31,409.68 551.39,414.77 554.47,420.50 557.55,426.70 560.63,432.95 563.72,438.86 566.80,444.08 569.88,448.30 572.96,451.53 576.04,453.87 579.12,455.47 582.20,456.45 585.28,456.96 588.36,457.13 591.44,457.10 594.52,456.98 597.60,456.88 600.68,456.83 603.77,456.77 606.85,456.62 609.93,456.28 613.01,455.68 616.09,454.75 619.17,453.43 622.25,451.67 625.33,449.42 628.41,446.67 631.49,443.56 634.57,440.31 637.65,437.12 640.74,434.18 643.82,431.61 646.90,429.32 649.98,427.17 653.06,425.01 656.14,422.73 659.22,420.28 662.30,417.74 665.38,415.24 668.46,412.88 671.54,410.75 674.62,408.84 677.70,407.06 680.79,405.30 683.87,403.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,100.01 73.87,100.92 76.95,102.91 80.03,105.66 83.11,108.83 86.19,112.12 89.27,115.29 92.35,118.17 95.43,120.63 98.51,122.56 101.59,123.87 104.68,124.55 107.76,124.64 110.84,124.20 113.92,123.25 117.00,121.90 120.08,120.40 123.16,119.09 126.24,118.24 129.32,118.12 132.40,118.80 135.48,120.04 138.56,121.53 141.65,123.01 144.73,124.21 147.81,125.21 150.89,126.41 153.97,128.22 157.05,131.02 160.13,135.12 163.21,140.38 166.29,146.40 169.37,152.82 172.45,159.27 175.53,165.45 178.61,171.16 181.70,176.26 184.78,180.61 187.86,184.13 190.94,186.81 194.02,188.89 197.10,190.60 200.18,192.18 203.26,193.83 206.34,195.70 209.42,197.85 212.50,200.32 215.58,203.15 218.67,206.37 221.75,209.92 224.83,213.71 227.91,217.64 230.99,221.64 234.07,225.64 237.15,229.66 240.23,233.73 243.31,237.88 246.39,242.15 249.47,246.55 252.55,251.10 255.63,255.81 258.72,260.67 261.80,265.69 264.88,270.89 267.96,276.29 271.04,281.93 274.12,287.83 277.20,293.98 280.28,300.22 283.36,306.26 286.44,311.85 289.52,316.75 292.60,320.81 295.69,324.10 298.77,326.78 301.85,328.98 304.93,330.84 308.01,332.52 311.09,334.16 314.17,335.93 317.25,337.95 320.33,340.34 323.41,343.18 326.49,346.50 329.57,350.31 332.66,354.63 335.74,359.46 338.82,364.59 341.90,369.76 344.98,374.70 348.06,379.18 351.14,382.97 354.22,385.79 357.30,387.39 360.38,387.53 363.46,386.02 366.54,383.00 369.62,379.26 372.71,375.61 375.79,372.83 378.87,371.60 381.95,372.15 385.03,374.25 388.11,377.67 391.19,382.13 394.27,387.39 397.35,393.29 400.43,399.73 403.51,406.62 406.59,413.87 409.68,421.35 412.76,428.65 415.84,435.27 418.92,440.81 422.00,444.86 425.08,447.29 428.16,448.41 431.24,448.55 434.32,448.07 437.40,447.26 440.48,446.25 443.56,444.98 446.64,443.36 449.73,441.31 452.81,438.76 455.89,435.77 458.97,432.42 462.05,428.83 465.13,425.08 468.21,421.28 471.29,417.57 474.37,414.07 477.45,410.92 480.53,408.23 483.61,405.99 486.70,403.99 489.78,402.00 492.86,399.83 495.94,397.29 499.02,394.44 502.10,391.58 505.18,388.98 508.26,386.93 511.34,385.65 514.42,385.11 517.50,385.15 520.58,385.61 523.66,386.35 526.75,387.25 529.83,388.31 532.91,389.56 535.99,391.04 539.07,392.77 542.15,394.78 545.23,397.07 548.31,399.63 551.39,402.45 554.47,405.52 557.55,408.77 560.63,412.08 563.72,415.36 566.80,418.48 569.88,421.38 572.96,424.11 576.04,426.76 579.12,429.44 582.20,432.24 585.28,435.20 588.36,438.17 591.44,440.99 594.52,443.46 597.60,445.43 600.68,446.80 603.77,447.51 606.85,447.55 609.93,446.88 613.01,445.52 616.09,443.55 619.17,441.18 622.25,438.62 625.33,436.03 628.41,433.60 631.49,431.49 634.57,429.89 637.65,428.95 640.74,428.81 643.82,429.52 646.90,430.93 649.98,432.85 653.06,435.07 656.14,437.43 659.22,439.81 662.30,442.23 665.38,444.72 668.46,447.31 671.54,450.03 674.62,452.83 677.70,455.58 680.79,458.15 683.87,460.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,145.70 73.87,146.44 76.95,148.07 80.03,150.31 83.11,152.90 86.19,155.59 89.27,158.11 92.35,160.19 95.43,161.59 98.51,162.08 101.59,161.51 104.68,160.04 107.76,157.99 110.84,155.69 113.92,153.44 117.00,151.46 120.08,149.72 123.16,148.12 126.24,146.52 129.32,144.84 132.40,142.99 135.48,140.99 138.56,138.86 141.65,136.62 144.73,134.31 147.81,132.10 150.89,130.30 153.97,129.20 157.05,129.07 160.13,130.14 163.21,132.35 166.29,135.51 169.37,139.42 172.45,143.89 175.53,148.72 178.61,153.62 181.70,158.29 184.78,162.47 187.86,165.93 190.94,168.57 194.02,170.57 197.10,172.16 200.18,173.53 203.26,174.88 206.34,176.41 209.42,178.30 212.50,180.70 215.58,183.76 218.67,187.60 221.75,192.21 224.83,197.54 227.91,203.53 230.99,210.11 234.07,217.20 237.15,224.59 240.23,232.06 243.31,239.41 246.39,246.45 249.47,253.10 252.55,259.43 255.63,265.53 258.72,271.52 261.80,277.47 264.88,283.44 267.96,289.42 271.04,295.42 274.12,301.43 277.20,307.41 280.28,313.21 283.36,318.59 286.44,323.33 289.52,327.22 292.60,330.18 295.69,332.58 298.77,334.87 301.85,337.48 304.93,340.83 308.01,345.01 311.09,349.60 314.17,354.13 317.25,358.13 320.33,361.19 323.41,363.26 326.49,364.65 329.57,365.67 332.66,366.63 335.74,367.81 338.82,369.24 341.90,370.84 344.98,372.51 348.06,374.17 351.14,375.73 354.22,377.09 357.30,378.17 360.38,378.90 363.46,379.22 366.54,379.16 369.62,379.00 372.71,378.99 375.79,379.41 378.87,380.47 381.95,382.22 385.03,384.52 388.11,387.22 391.19,390.17 394.27,393.24 397.35,396.38 400.43,399.54 403.51,402.72 406.59,405.89 409.68,409.03 412.76,412.10 415.84,415.04 418.92,417.82 422.00,420.38 425.08,422.72 428.16,424.83 431.24,426.74 434.32,428.46 437.40,430.00 440.48,431.31 443.56,432.27 446.64,432.76 449.73,432.68 452.81,431.96 455.89,430.70 458.97,429.10 462.05,427.33 465.13,425.57 468.21,423.92 471.29,422.26 474.37,420.39 477.45,418.15 480.53,415.36 483.61,411.96 486.70,408.03 489.78,403.68 492.86,399.02 495.94,394.15 499.02,389.30 502.10,384.85 505.18,381.13 508.26,378.45 511.34,377.03 514.42,376.81 517.50,377.55 520.58,379.00 523.66,380.94 526.75,383.20 529.83,385.74 532.91,388.60 535.99,391.79 539.07,395.35 542.15,399.32 545.23,403.76 548.31,408.73 551.39,414.28 554.47,420.45 557.55,427.03 560.63,433.60 563.72,439.73 566.80,445.06 569.88,449.27 572.96,452.43 576.04,454.79 579.12,456.58 582.20,458.03 585.28,459.34 588.36,460.58 591.44,461.79 594.52,462.98 597.60,464.17 600.68,465.33 603.77,466.34 606.85,467.09 609.93,467.48 613.01,467.39 616.09,466.73 619.17,465.42 622.25,463.38 625.33,460.54 628.41,456.86 631.49,452.57 634.57,447.97 637.65,443.34 640.74,438.96 643.82,435.05 646.90,431.69 649.98,428.93 653.06,426.80 656.14,425.32 659.22,424.43 662.30,423.95 665.38,423.70 668.46,423.52 671.54,423.26 674.62,422.85 677.70,422.32 680.79,421.70 683.87,421.02 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,77.64 73.87,78.49 76.95,80.36 80.03,83.00 83.11,86.16 86.19,89.56 89.27,92.95 92.35,96.04 95.43,98.57 98.51,100.32 101.59,101.13 104.68,101.18 107.76,100.84 110.84,100.47 113.92,100.40 117.00,100.90 120.08,102.10 123.16,104.05 126.24,106.78 129.32,110.31 132.40,114.53 135.48,119.00 138.56,123.31 141.65,127.05 144.73,129.88 147.81,131.86 150.89,133.53 153.97,135.40 157.05,137.98 160.13,141.66 163.21,146.22 166.29,151.12 169.37,155.83 172.45,159.84 175.53,162.81 178.61,164.87 181.70,166.32 184.78,167.45 187.86,168.53 190.94,169.79 194.02,171.40 197.10,173.50 200.18,176.23 203.26,179.67 206.34,183.79 209.42,188.41 212.50,193.35 215.58,198.45 218.67,203.57 221.75,208.68 224.83,213.84 227.91,219.10 230.99,224.54 234.07,230.17 237.15,235.97 240.23,241.86 243.31,247.79 246.39,253.71 249.47,259.51 252.55,265.05 255.63,270.14 258.72,274.64 261.80,278.44 264.88,281.68 267.96,284.80 271.04,288.23 274.12,292.36 277.20,297.51 280.28,303.48 283.36,309.82 286.44,316.07 289.52,321.82 292.60,326.77 295.69,331.07 298.77,334.98 301.85,338.76 304.93,342.67 308.01,346.78 311.09,350.89 314.17,354.75 317.25,358.12 320.33,360.81 323.41,362.74 326.49,363.95 329.57,364.54 332.66,364.56 335.74,364.12 338.82,363.42 341.90,362.74 344.98,362.34 348.06,362.44 351.14,363.21 354.22,364.56 357.30,366.35 360.38,368.43 363.46,370.67 366.54,372.99 369.62,375.39 372.71,377.91 375.79,380.59 378.87,383.46 381.95,386.52 385.03,389.79 388.11,393.27 391.19,396.94 394.27,400.81 397.35,404.90 400.43,409.22 403.51,413.80 406.59,418.64 409.68,423.71 412.76,428.75 415.84,433.47 418.92,437.59 422.00,440.85 425.08,443.11 428.16,444.35 431.24,444.60 434.32,443.90 437.40,442.29 440.48,439.84 443.56,436.67 446.64,432.88 449.73,428.55 452.81,423.80 455.89,418.77 458.97,413.69 462.05,408.71 465.13,404.02 468.21,399.71 471.29,395.72 474.37,391.95 477.45,388.30 480.53,384.66 483.61,381.03 486.70,377.59 489.78,374.54 492.86,372.03 495.94,370.25 499.02,369.23 502.10,368.99 505.18,369.48 508.26,370.67 511.34,372.52 514.42,374.94 517.50,377.81 520.58,380.99 523.66,384.40 526.75,387.95 529.83,391.62 532.91,395.39 535.99,399.27 539.07,403.26 542.15,407.38 545.23,411.74 548.31,416.42 551.39,421.51 554.47,427.08 557.55,433.06 560.63,439.23 563.72,445.39 566.80,451.34 569.88,456.91 572.96,461.93 576.04,466.27 579.12,469.82 582.20,472.46 585.28,474.14 588.36,474.93 591.44,474.91 594.52,474.19 597.60,472.84 600.68,470.94 603.77,468.52 606.85,465.61 609.93,462.21 613.01,458.36 616.09,454.16 619.17,449.78 622.25,445.38 625.33,441.10 628.41,437.10 631.49,433.54 634.57,430.58 637.65,428.37 640.74,427.05 643.82,426.67 646.90,427.06 649.98,428.03 653.06,429.35 656.14,430.86 659.22,432.45 662.30,434.17 665.38,436.08 668.46,438.26 671.54,440.74 674.62,443.47 677.70,446.27 680.79,448.95 683.87,451.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,132.17 73.87,132.18 76.95,132.09 80.03,131.79 83.11,131.15 86.19,130.08 89.27,128.70 92.35,127.39 95.43,126.51 98.51,126.40 101.59,127.34 104.68,129.25 107.76,131.90 110.84,135.02 113.92,138.37 117.00,141.71 120.08,144.65 123.16,146.80 126.24,147.82 129.32,147.41 132.40,145.51 135.48,142.57 138.56,139.12 141.65,135.61 144.73,132.50 147.81,130.11 150.89,128.62 153.97,128.22 157.05,129.02 160.13,131.11 163.21,134.45 166.29,138.92 169.37,144.38 172.45,150.71 175.53,157.74 178.61,164.99 181.70,171.93 184.78,178.09 187.86,183.04 190.94,186.55 194.02,188.78 197.10,189.96 200.18,190.30 203.26,190.00 206.34,189.45 209.42,189.15 212.50,189.59 215.58,191.21 218.67,194.37 221.75,199.05 224.83,205.04 227.91,212.11 230.99,220.05 234.07,228.62 237.15,237.49 240.23,246.28 243.31,254.68 246.39,262.42 249.47,269.24 252.55,275.00 255.63,279.54 258.72,282.77 261.80,284.58 264.88,285.23 267.96,285.25 271.04,285.19 274.12,285.54 277.20,286.71 280.28,288.80 283.36,291.72 286.44,295.35 289.52,299.57 292.60,304.25 295.69,309.14 298.77,314.00 301.85,318.60 304.93,322.73 308.01,326.34 311.09,329.61 314.17,332.78 317.25,336.06 320.33,339.64 323.41,343.59 326.49,347.85 329.57,352.35 332.66,357.00 335.74,361.72 338.82,366.27 341.90,370.29 344.98,373.50 348.06,375.62 351.14,376.50 354.22,376.40 357.30,375.72 360.38,374.80 363.46,373.99 366.54,373.62 369.62,374.01 372.71,375.47 375.79,378.26 378.87,382.59 381.95,388.30 385.03,394.84 388.11,401.68 391.19,408.31 394.27,414.32 397.35,419.54 400.43,423.97 403.51,427.64 406.59,430.57 409.68,432.82 412.76,434.43 415.84,435.46 418.92,435.98 422.00,436.01 425.08,435.61 428.16,434.77 431.24,433.50 434.32,431.80 437.40,429.67 440.48,427.23 443.56,424.67 446.64,422.19 449.73,419.97 452.81,418.15 455.89,416.73 458.97,415.63 462.05,414.76 465.13,414.03 468.21,413.35 471.29,412.54 474.37,411.39 477.45,409.75 480.53,407.44 483.61,404.50 486.70,401.22 489.78,397.94 492.86,394.98 495.94,392.60 499.02,390.95 502.10,389.99 505.18,389.69 508.26,390.01 511.34,390.88 514.42,392.26 517.50,394.06 520.58,396.24 523.66,398.73 526.75,401.46 529.83,404.26 532.91,406.95 535.99,409.37 539.07,411.37 542.15,412.89 545.23,414.03 548.31,414.90 551.39,415.60 554.47,416.23 557.55,416.85 560.63,417.45 563.72,418.04 566.80,418.62 569.88,419.17 572.96,419.72 576.04,420.31 579.12,420.94 582.20,421.66 585.28,422.45 588.36,423.19 591.44,423.74 594.52,423.97 597.60,423.76 600.68,423.21 603.77,422.75 606.85,422.85 609.93,423.94 613.01,426.39 616.09,430.18 619.17,434.95 622.25,440.33 625.33,445.96 628.41,451.52 631.49,456.77 634.57,461.55 637.65,465.69 640.74,469.07 643.82,471.63 646.90,473.53 649.98,474.95 653.06,476.07 656.14,477.08 659.22,478.01 662.30,478.73 665.38,479.07 668.46,478.88 671.54,478.03 674.62,476.52 677.70,474.47 680.79,472.03 683.87,469.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,49.76 73.87,50.67 76.95,52.85 80.03,56.18 83.11,60.56 86.19,65.85 89.27,71.95 92.35,78.78 95.43,86.27 98.51,94.36 101.59,102.97 104.68,111.87 107.76,120.72 110.84,129.22 113.92,137.08 117.00,144.08 120.08,150.03 123.16,154.79 126.24,158.24 129.32,160.28 132.40,160.88 135.48,160.17 138.56,158.28 141.65,155.32 144.73,151.44 147.81,146.96 150.89,142.43 153.97,138.40 157.05,135.32 160.13,133.59 163.21,133.20 166.29,133.91 169.37,135.48 172.45,137.65 175.53,140.25 178.61,143.29 181.70,146.83 184.78,150.97 187.86,155.76 190.94,161.19 194.02,167.02 197.10,173.00 200.18,178.92 203.26,184.57 206.34,189.88 209.42,194.89 212.50,199.66 215.58,204.26 218.67,208.75 221.75,213.20 224.83,217.65 227.91,222.15 230.99,226.76 234.07,231.47 237.15,236.14 240.23,240.56 243.31,244.58 246.39,248.03 249.47,250.89 252.55,253.39 255.63,255.79 258.72,258.34 261.80,261.26 264.88,264.73 267.96,268.91 271.04,273.90 274.12,279.83 277.20,286.74 280.28,294.43 283.36,302.55 286.44,310.77 289.52,318.80 292.60,326.36 295.69,333.26 298.77,339.36 301.85,344.53 304.93,348.66 308.01,351.68 311.09,353.60 314.17,354.41 317.25,354.12 320.33,352.77 323.41,350.62 326.49,348.15 329.57,345.86 332.66,344.17 335.74,343.45 338.82,343.77 341.90,345.02 344.98,347.10 348.06,349.87 351.14,353.24 354.22,357.09 357.30,361.35 360.38,365.93 363.46,370.77 366.54,375.83 369.62,381.13 372.71,386.67 375.79,392.49 378.87,398.59 381.95,404.85 385.03,411.00 388.11,416.78 391.19,421.95 394.27,426.32 397.35,429.85 400.43,432.61 403.51,434.66 406.59,436.07 409.68,436.90 412.76,437.20 415.84,437.00 418.92,436.33 422.00,435.23 425.08,433.74 428.16,431.96 431.24,429.96 434.32,427.84 437.40,425.67 440.48,423.50 443.56,421.41 446.64,419.45 449.73,417.65 452.81,416.05 455.89,414.58 458.97,413.11 462.05,411.52 465.13,409.72 468.21,407.64 471.29,405.37 474.37,403.03 477.45,400.75 480.53,398.62 483.61,396.71 486.70,394.96 489.78,393.31 492.86,391.69 495.94,390.05 499.02,388.46 502.10,387.05 505.18,386.01 508.26,385.46 511.34,385.53 514.42,386.19 517.50,387.35 520.58,388.92 523.66,390.80 526.75,392.92 529.83,395.21 532.91,397.61 535.99,400.08 539.07,402.57 542.15,405.10 545.23,407.82 548.31,410.87 551.39,414.39 554.47,418.48 557.55,423.08 560.63,427.91 563.72,432.73 566.80,437.29 569.88,441.39 572.96,444.92 576.04,447.84 579.12,450.14 582.20,451.78 585.28,452.79 588.36,453.27 591.44,453.35 594.52,453.15 597.60,452.78 600.68,452.28 603.77,451.55 606.85,450.50 609.93,449.03 613.01,447.05 616.09,444.73 619.17,442.42 622.25,440.48 625.33,439.25 628.41,438.97 631.49,439.64 634.57,441.10 637.65,443.20 640.74,445.77 643.82,448.67 646.90,451.74 649.98,454.81 653.06,457.75 656.14,460.44 659.22,462.76 662.30,464.60 665.38,465.89 668.46,466.53 671.54,466.47 674.62,465.83 677.70,464.88 680.79,463.88 683.87,463.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,123.08 73.87,123.28 76.95,123.65 80.03,124.07 83.11,124.41 86.19,124.56 89.27,124.58 92.35,124.69 95.43,125.13 98.51,126.11 101.59,127.82 104.68,130.25 107.76,133.26 110.84,136.75 113.92,140.58 117.00,144.59 120.08,148.32 123.16,151.26 126.24,152.96 129.32,152.99 132.40,151.26 135.48,148.24 138.56,144.51 141.65,140.58 144.73,136.95 147.81,133.97 150.89,131.87 153.97,130.83 157.05,131.00 160.13,132.47 163.21,135.13 166.29,138.73 169.37,143.03 172.45,147.81 175.53,152.87 178.61,158.06 181.70,163.28 184.78,168.42 187.86,173.40 190.94,178.16 194.02,182.59 197.10,186.63 200.18,190.22 203.26,193.30 206.34,195.95 209.42,198.39 212.50,200.83 215.58,203.46 218.67,206.45 221.75,209.82 224.83,213.49 227.91,217.40 230.99,221.49 234.07,225.70 237.15,230.01 240.23,234.44 243.31,239.00 246.39,243.69 249.47,248.55 252.55,253.67 255.63,259.16 258.72,265.10 261.80,271.57 264.88,278.50 267.96,285.70 271.04,292.95 274.12,300.08 277.20,306.92 280.28,313.29 283.36,319.01 286.44,323.94 289.52,327.95 292.60,330.97 295.69,333.20 298.77,334.88 301.85,336.25 304.93,337.53 308.01,338.86 311.09,340.24 314.17,341.69 317.25,343.16 320.33,344.64 323.41,346.08 326.49,347.41 329.57,348.57 332.66,349.50 335.74,350.14 338.82,350.54 341.90,350.79 344.98,350.97 348.06,351.16 351.14,351.45 354.22,352.06 357.30,353.20 360.38,355.08 363.46,357.88 366.54,361.69 369.62,366.47 372.71,372.15 375.79,378.65 378.87,385.90 381.95,393.71 385.03,401.72 388.11,409.65 391.19,417.20 394.27,424.12 397.35,430.18 400.43,435.16 403.51,438.88 406.59,441.18 409.68,442.00 412.76,441.61 415.84,440.33 418.92,438.50 422.00,436.39 425.08,434.25 428.16,432.14 431.24,430.15 434.32,428.31 437.40,426.66 440.48,425.11 443.56,423.47 446.64,421.57 449.73,419.23 452.81,416.33 455.89,413.00 458.97,409.51 462.05,406.11 465.13,403.04 468.21,400.47 471.29,398.41 474.37,396.81 477.45,395.60 480.53,394.72 483.61,394.12 486.70,393.74 489.78,393.52 492.86,393.42 495.94,393.39 499.02,393.41 502.10,393.47 505.18,393.56 508.26,393.67 511.34,393.82 514.42,394.13 517.50,394.77 520.58,395.90 523.66,397.66 526.75,400.10 529.83,402.98 532.91,405.99 535.99,408.82 539.07,411.21 542.15,413.07 545.23,414.58 548.31,415.99 551.39,417.52 554.47,419.36 557.55,421.60 560.63,424.18 563.72,427.04 566.80,430.13 569.88,433.37 572.96,436.58 576.04,439.58 579.12,442.16 582.20,444.15 585.28,445.44 588.36,446.10 591.44,446.23 594.52,445.95 597.60,445.35 600.68,444.55 603.77,443.63 606.85,442.70 609.93,441.84 613.01,441.11 616.09,440.53 619.17,440.05 622.25,439.63 625.33,439.22 628.41,438.79 631.49,438.42 634.57,438.24 637.65,438.36 640.74,438.90 643.82,439.92 646.90,441.36 649.98,443.12 653.06,445.13 656.14,447.29 659.22,449.49 662.30,451.58 665.38,453.42 668.46,454.88 671.54,455.84 674.62,456.35 677.70,456.58 680.79,456.69 683.87,456.84 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,91.11 73.87,91.70 76.95,93.01 80.03,94.84 83.11,96.99 86.19,99.28 89.27,101.64 92.35,104.14 95.43,106.88 98.51,109.93 101.59,113.36 104.68,117.16 107.76,121.22 110.84,125.48 113.92,129.85 117.00,134.24 120.08,138.34 123.16,141.86 126.24,144.49 129.32,145.97 132.40,146.24 135.48,145.60 138.56,144.37 141.65,142.88 144.73,141.43 147.81,140.26 150.89,139.60 153.97,139.63 157.05,140.49 160.13,142.31 163.21,144.87 166.29,147.84 169.37,150.86 172.45,153.63 175.53,155.94 178.61,157.95 181.70,159.91 184.78,162.07 187.86,164.66 190.94,167.76 194.02,171.14 197.10,174.52 200.18,177.66 203.26,180.31 206.34,182.51 209.42,184.50 212.50,186.55 215.58,188.91 218.67,191.80 221.75,195.39 224.83,199.81 227.91,205.15 230.99,211.50 234.07,218.85 237.15,226.81 240.23,234.92 243.31,242.73 246.39,249.84 249.47,256.05 252.55,261.48 255.63,266.32 258.72,270.75 261.80,274.95 264.88,279.05 267.96,283.15 271.04,287.35 274.12,291.70 277.20,296.28 280.28,301.00 283.36,305.78 286.44,310.49 289.52,315.04 292.60,319.35 295.69,323.46 298.77,327.42 301.85,331.30 304.93,335.15 308.01,339.00 311.09,342.83 314.17,346.62 317.25,350.34 320.33,353.96 323.41,357.48 326.49,360.86 329.57,364.11 332.66,367.21 335.74,370.14 338.82,372.88 341.90,375.37 344.98,377.56 348.06,379.42 351.14,380.93 354.22,382.20 357.30,383.36 360.38,384.53 363.46,385.82 366.54,387.24 369.62,388.61 372.71,389.71 375.79,390.36 378.87,390.39 381.95,389.85 385.03,389.01 388.11,388.12 391.19,387.44 394.27,387.19 397.35,387.48 400.43,388.37 403.51,389.89 406.59,392.09 409.68,394.91 412.76,398.08 415.84,401.30 418.92,404.25 422.00,406.66 425.08,408.47 428.16,409.92 431.24,411.33 434.32,412.97 437.40,415.09 440.48,417.70 443.56,420.53 446.64,423.32 449.73,425.83 452.81,427.82 455.89,429.19 458.97,429.93 462.05,430.01 465.13,429.41 468.21,428.17 471.29,426.38 474.37,424.19 477.45,421.72 480.53,419.07 483.61,416.34 486.70,413.62 489.78,410.96 492.86,408.41 495.94,406.01 499.02,403.84 502.10,401.96 505.18,400.45 508.26,399.35 511.34,398.73 514.42,398.57 517.50,398.86 520.58,399.58 523.66,400.69 526.75,402.16 529.83,403.86 532.91,405.64 535.99,407.38 539.07,408.96 542.15,410.32 545.23,411.46 548.31,412.39 551.39,413.14 554.47,413.73 557.55,414.29 560.63,415.04 563.72,416.15 566.80,417.83 569.88,420.18 572.96,423.03 576.04,426.03 579.12,428.87 582.20,431.26 585.28,433.00 588.36,434.33 591.44,435.53 594.52,436.91 597.60,438.72 600.68,441.02 603.77,443.52 606.85,445.90 609.93,447.84 613.01,449.07 616.09,449.59 619.17,449.61 622.25,449.38 625.33,449.11 628.41,448.99 631.49,449.05 634.57,449.21 637.65,449.40 640.74,449.55 643.82,449.62 646.90,449.63 649.98,449.63 653.06,449.66 656.14,449.77 659.22,449.94 662.30,450.08 665.38,450.07 668.46,449.83 671.54,449.26 674.62,448.41 677.70,447.42 680.79,446.45 683.87,445.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,105.52 73.87,106.00 76.95,107.11 80.03,108.75 83.11,110.81 86.19,113.17 89.27,115.78 92.35,118.62 95.43,121.66 98.51,124.91 101.59,128.35 104.68,131.84 107.76,135.16 110.84,138.13 113.92,140.57 117.00,142.36 120.08,143.50 123.16,144.04 126.24,144.04 129.32,143.55 132.40,142.66 135.48,141.53 138.56,140.32 141.65,139.17 144.73,138.20 147.81,137.51 150.89,137.14 153.97,137.14 157.05,137.52 160.13,138.32 163.21,139.55 166.29,141.21 169.37,143.30 172.45,145.82 175.53,148.77 178.61,152.16 181.70,155.99 184.78,160.27 187.86,165.01 190.94,170.14 194.02,175.44 197.10,180.72 200.18,185.75 203.26,190.39 206.34,194.60 209.42,198.56 212.50,202.40 215.58,206.29 218.67,210.35 221.75,214.45 224.83,218.35 227.91,221.81 230.99,224.62 234.07,226.65 237.15,228.17 240.23,229.53 243.31,231.07 246.39,233.09 249.47,235.85 252.55,239.59 255.63,244.47 258.72,250.65 261.80,258.26 264.88,267.11 267.96,276.71 271.04,286.59 274.12,296.30 277.20,305.44 280.28,313.78 283.36,321.17 286.44,327.49 289.52,332.63 292.60,336.57 295.69,339.44 298.77,341.42 301.85,342.69 304.93,343.40 308.01,343.79 311.09,344.26 314.17,345.17 317.25,346.86 320.33,349.63 323.41,353.40 326.49,357.77 329.57,362.29 332.66,366.58 335.74,370.28 338.82,373.29 341.90,375.65 344.98,377.42 348.06,378.65 351.14,379.44 354.22,380.06 357.30,380.79 360.38,381.88 363.46,383.57 366.54,385.94 369.62,388.82 372.71,391.99 375.79,395.25 378.87,398.40 381.95,401.33 385.03,403.94 388.11,406.17 391.19,407.99 394.27,409.37 397.35,410.50 400.43,411.71 403.51,413.27 406.59,415.44 409.68,418.36 412.76,421.67 415.84,424.92 418.92,427.68 422.00,429.54 425.08,430.23 428.16,429.67 431.24,427.83 434.32,424.68 437.40,420.25 440.48,414.97 443.56,409.64 446.64,405.06 449.73,401.95 452.81,400.86 455.89,401.38 458.97,402.66 462.05,403.87 465.13,404.22 468.21,403.16 471.29,400.86 474.37,397.70 477.45,394.04 480.53,390.24 483.61,386.64 486.70,383.52 489.78,381.12 492.86,379.67 495.94,379.36 499.02,380.19 502.10,382.02 505.18,384.68 508.26,388.02 511.34,391.90 514.42,396.16 517.50,400.64 520.58,405.21 523.66,409.73 526.75,414.10 529.83,418.12 532.91,421.63 535.99,424.46 539.07,426.49 542.15,427.69 545.23,428.27 548.31,428.45 551.39,428.44 554.47,428.43 557.55,428.55 560.63,428.89 563.72,429.53 566.80,430.50 569.88,431.86 572.96,433.55 576.04,435.47 579.12,437.54 582.20,439.65 585.28,441.73 588.36,443.67 591.44,445.35 594.52,446.68 597.60,447.57 600.68,447.99 603.77,448.01 606.85,447.70 609.93,447.12 613.01,446.35 616.09,445.45 619.17,444.51 622.25,443.58 625.33,442.73 628.41,442.00 631.49,441.30 634.57,440.49 637.65,439.44 640.74,438.02 643.82,436.17 646.90,434.06 649.98,431.89 653.06,429.87 656.14,428.17 659.22,426.94 662.30,426.25 665.38,426.18 668.46,426.77 671.54,428.06 674.62,429.94 677.70,432.17 680.79,434.52 683.87,436.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,78.71 73.87,79.04 76.95,80.03 80.03,81.86 83.11,84.71 86.19,88.71 89.27,93.80 92.35,99.74 95.43,106.23 98.51,113.04 101.59,119.93 104.68,126.75 107.76,133.38 110.84,139.72 113.92,145.69 117.00,151.18 120.08,155.93 123.16,159.66 126.24,162.09 129.32,163.01 132.40,162.34 135.48,160.37 138.56,157.41 141.65,153.75 144.73,149.68 147.81,145.50 150.89,141.54 153.97,138.10 157.05,135.45 160.13,133.81 163.21,133.29 166.29,133.96 169.37,135.86 172.45,139.01 175.53,143.39 178.61,148.79 181.70,154.97 184.78,161.71 187.86,168.79 190.94,175.96 194.02,182.83 197.10,189.03 200.18,194.25 203.26,198.18 206.34,200.96 209.42,203.05 212.50,204.99 215.58,207.22 218.67,210.15 221.75,213.90 224.83,218.43 227.91,223.68 230.99,229.57 234.07,235.97 237.15,242.49 240.23,248.70 243.31,254.20 246.39,258.63 249.47,261.83 252.55,264.00 255.63,265.37 258.72,266.18 261.80,266.67 264.88,267.24 267.96,268.46 271.04,270.87 274.12,274.95 277.20,281.05 280.28,288.78 283.36,297.37 286.44,306.05 289.52,314.13 292.60,321.06 295.69,326.77 298.77,331.31 301.85,334.77 304.93,337.24 308.01,338.89 311.09,340.03 314.17,340.96 317.25,341.97 320.33,343.29 323.41,345.04 326.49,347.24 329.57,349.84 332.66,352.83 335.74,356.15 338.82,359.70 341.90,363.29 344.98,366.80 348.06,370.07 351.14,373.02 354.22,375.76 357.30,378.39 360.38,381.07 363.46,383.90 366.54,386.87 369.62,389.74 372.71,392.21 375.79,394.04 378.87,394.99 381.95,395.18 385.03,395.08 388.11,395.12 391.19,395.74 394.27,397.26 397.35,399.49 400.43,401.95 403.51,404.18 406.59,405.77 409.68,406.46 412.76,406.61 415.84,406.70 418.92,407.23 422.00,408.63 425.08,411.06 428.16,414.11 431.24,417.37 434.32,420.39 437.40,422.80 440.48,424.39 443.56,425.09 446.64,424.90 449.73,423.81 452.81,421.84 455.89,419.24 458.97,416.35 462.05,413.51 465.13,410.99 468.21,409.01 471.29,407.46 474.37,406.17 477.45,404.96 480.53,403.67 483.61,402.24 486.70,400.86 489.78,399.70 492.86,398.94 495.94,398.74 499.02,399.11 502.10,399.92 505.18,401.05 508.26,402.37 511.34,403.77 514.42,405.23 517.50,406.79 520.58,408.47 523.66,410.30 526.75,412.31 529.83,414.47 532.91,416.75 535.99,419.11 539.07,421.52 542.15,423.93 545.23,426.23 548.31,428.35 551.39,430.18 554.47,431.66 557.55,432.87 560.63,434.02 563.72,435.34 566.80,437.01 569.88,439.17 572.96,441.65 576.04,444.08 579.12,446.15 582.20,447.55 585.28,448.08 588.36,447.92 591.44,447.31 594.52,446.50 597.60,445.72 600.68,445.12 603.77,444.66 606.85,444.33 609.93,444.07 613.01,443.84 616.09,443.55 619.17,443.08 622.25,442.29 625.33,441.09 628.41,439.41 631.49,437.44 634.57,435.49 637.65,433.85 640.74,432.79 643.82,432.50 646.90,432.90 649.98,433.85 653.06,435.22 656.14,436.87 659.22,438.71 662.30,440.70 665.38,442.79 668.46,444.96 671.54,447.19 674.62,449.40 677.70,451.50 680.79,453.37 683.87,454.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,125.26 73.87,125.60 76.95,126.28 80.03,127.11 83.11,127.90 86.19,128.46 89.27,128.76 92.35,128.91 95.43,129.04 98.51,129.24 101.59,129.63 104.68,130.23 107.76,131.01 110.84,131.96 113.92,133.05 117.00,134.25 120.08,135.56 123.16,136.95 126.24,138.40 129.32,139.91 132.40,141.48 135.48,143.12 138.56,144.87 141.65,146.76 144.73,148.80 147.81,150.95 150.89,153.09 153.97,155.10 157.05,156.88 160.13,158.36 163.21,159.64 166.29,160.94 169.37,162.48 172.45,164.45 175.53,166.94 178.61,169.66 181.70,172.23 184.78,174.30 187.86,175.53 190.94,175.81 194.02,175.44 197.10,174.75 200.18,174.07 203.26,173.70 206.34,173.97 209.42,175.23 212.50,177.80 215.58,181.94 218.67,187.87 221.75,195.34 224.83,203.88 227.91,213.04 230.99,222.42 234.07,231.61 237.15,240.23 240.23,247.91 243.31,254.33 246.39,259.21 249.47,262.53 252.55,264.67 255.63,266.08 258.72,267.19 261.80,268.38 264.88,269.89 267.96,271.82 271.04,274.22 274.12,277.14 277.20,280.61 280.28,284.67 283.36,289.38 286.44,294.78 289.52,300.92 292.60,307.76 295.69,315.03 298.77,322.38 301.85,329.51 304.93,336.13 308.01,342.08 311.09,347.42 314.17,352.25 317.25,356.66 320.33,360.75 323.41,364.51 326.49,367.86 329.57,370.71 332.66,372.96 335.74,374.55 338.82,375.52 341.90,375.95 344.98,375.95 348.06,375.59 351.14,374.97 354.22,374.23 357.30,373.51 360.38,372.93 363.46,372.61 366.54,372.66 369.62,373.17 372.71,374.22 375.79,375.89 378.87,378.23 381.95,381.21 385.03,384.69 388.11,388.53 391.19,392.62 394.27,396.84 397.35,401.17 400.43,405.61 403.51,410.19 406.59,414.92 409.68,419.80 412.76,424.68 415.84,429.38 418.92,433.75 422.00,437.64 425.08,440.90 428.16,443.34 431.24,444.80 434.32,445.13 437.40,444.20 440.48,442.06 443.56,438.86 446.64,434.79 449.73,430.03 452.81,424.76 455.89,419.27 458.97,413.94 462.05,409.11 465.13,405.07 468.21,402.02 471.29,399.90 474.37,398.55 477.45,397.84 480.53,397.61 483.61,397.67 486.70,397.73 489.78,397.48 492.86,396.68 495.94,395.11 499.02,392.85 502.10,390.31 505.18,387.86 508.26,385.87 511.34,384.67 514.42,384.34 517.50,384.91 520.58,386.34 523.66,388.62 526.75,391.69 529.83,395.41 532.91,399.60 535.99,404.13 539.07,408.85 542.15,413.63 545.23,418.35 548.31,422.87 551.39,427.10 554.47,430.93 557.55,434.21 560.63,436.69 563.72,438.16 566.80,438.42 569.88,437.36 572.96,435.32 576.04,432.87 579.12,430.53 582.20,428.79 585.28,428.00 588.36,428.15 591.44,429.11 594.52,430.73 597.60,432.89 600.68,435.38 603.77,437.86 606.85,440.03 609.93,441.59 613.01,442.31 616.09,442.25 619.17,441.73 622.25,441.09 625.33,440.65 628.41,440.66 631.49,441.00 634.57,441.38 637.65,441.54 640.74,441.22 643.82,440.26 646.90,438.85 649.98,437.26 653.06,435.75 656.14,434.55 659.22,433.86 662.30,433.82 665.38,434.54 668.46,436.12 671.54,438.63 674.62,441.83 677.70,445.24 680.79,448.37 683.87,450.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,134.23 73.87,133.65 76.95,132.58 80.03,131.45 83.11,130.67 86.19,130.61 89.27,131.44 92.35,133.04 95.43,135.30 98.51,138.08 101.59,141.24 104.68,144.54 107.76,147.64 110.84,150.25 113.92,152.10 117.00,153.03 120.08,153.21 123.16,152.90 126.24,152.36 129.32,151.83 132.40,151.39 135.48,150.82 138.56,149.85 141.65,148.23 144.73,145.75 147.81,142.55 150.89,139.18 153.97,136.19 157.05,134.06 160.13,133.23 163.21,133.77 166.29,135.56 169.37,138.48 172.45,142.37 175.53,147.07 178.61,152.27 181.70,157.65 184.78,162.90 187.86,167.76 190.94,172.12 194.02,176.15 197.10,180.08 200.18,184.11 203.26,188.43 206.34,193.08 209.42,197.96 212.50,202.94 215.58,207.91 218.67,212.76 221.75,217.42 224.83,221.83 227.91,225.96 230.99,229.76 234.07,233.23 237.15,236.51 240.23,239.75 243.31,243.08 246.39,246.66 249.47,250.52 252.55,254.57 255.63,258.69 258.72,262.77 261.80,266.69 264.88,270.44 267.96,274.07 271.04,277.66 274.12,281.25 277.20,284.91 280.28,288.68 283.36,292.62 286.44,296.75 289.52,301.11 292.60,305.71 295.69,310.54 298.77,315.56 301.85,320.74 304.93,326.05 308.01,331.41 311.09,336.68 314.17,341.70 317.25,346.35 320.33,350.50 323.41,354.19 326.49,357.59 329.57,360.89 332.66,364.25 335.74,367.81 338.82,371.54 341.90,375.32 344.98,379.02 348.06,382.53 351.14,385.71 354.22,388.37 357.30,390.30 360.38,391.30 363.46,391.21 366.54,390.06 369.62,388.25 372.71,386.18 375.79,384.27 378.87,382.87 381.95,382.28 385.03,382.70 388.11,384.32 391.19,387.29 394.27,391.71 397.35,397.33 400.43,403.75 403.51,410.58 406.59,417.47 409.68,424.10 412.76,430.31 415.84,435.95 418.92,440.92 422.00,445.14 425.08,448.50 428.16,450.84 431.24,452.03 434.32,451.93 437.40,450.44 440.48,447.65 443.56,443.83 446.64,439.25 449.73,434.16 452.81,428.80 455.89,423.35 458.97,417.97 462.05,412.81 465.13,407.98 468.21,403.57 471.29,399.60 474.37,396.03 477.45,392.86 480.53,390.05 483.61,387.61 486.70,385.59 489.78,384.05 492.86,383.05 495.94,382.63 499.02,382.81 502.10,383.62 505.18,385.07 508.26,387.16 511.34,389.87 514.42,392.98 517.50,396.15 520.58,399.09 523.66,401.52 526.75,403.26 529.83,404.43 532.91,405.19 535.99,405.75 539.07,406.27 542.15,406.90 545.23,407.74 548.31,408.89 551.39,410.43 554.47,412.40 557.55,414.84 560.63,417.71 563.72,420.97 566.80,424.58 569.88,428.52 572.96,432.68 576.04,437.00 579.12,441.36 582.20,445.70 585.28,449.92 588.36,453.89 591.44,457.47 594.52,460.52 597.60,462.92 600.68,464.59 603.77,465.42 606.85,465.34 609.93,464.28 613.01,462.19 616.09,459.25 619.17,455.81 622.25,452.23 625.33,448.84 628.41,445.89 631.49,443.33 634.57,440.98 637.65,438.63 640.74,436.09 643.82,433.28 646.90,430.40 649.98,427.74 653.06,425.56 656.14,424.11 659.22,423.47 662.30,423.45 665.38,423.82 668.46,424.38 671.54,424.93 674.62,425.36 677.70,425.68 680.79,425.86 683.87,425.92 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,134.22 73.87,134.96 76.95,136.51 80.03,138.53 83.11,140.69 86.19,142.67 89.27,144.33 92.35,145.69 95.43,146.80 98.51,147.71 101.59,148.49 104.68,149.34 107.76,150.49 110.84,152.19 113.92,154.65 117.00,157.95 120.08,161.69 123.16,165.35 126.24,168.45 129.32,170.51 132.40,171.33 135.48,171.08 138.56,170.00 141.65,168.34 144.73,166.31 147.81,164.04 150.89,161.51 153.97,158.69 157.05,155.54 160.13,152.06 163.21,148.58 166.29,145.59 169.37,143.54 172.45,142.86 175.53,143.79 178.61,146.10 181.70,149.38 184.78,153.26 187.86,157.37 190.94,161.54 194.02,165.90 197.10,170.64 200.18,175.94 203.26,181.97 206.34,188.73 209.42,196.08 212.50,203.83 215.58,211.84 218.67,219.93 221.75,227.80 224.83,235.02 227.91,241.24 230.99,246.13 234.07,249.48 237.15,251.50 240.23,252.53 243.31,252.86 246.39,252.79 249.47,252.62 252.55,252.66 255.63,253.20 258.72,254.49 261.80,256.74 264.88,259.91 267.96,263.69 271.04,267.76 274.12,271.85 277.20,275.71 280.28,279.53 283.36,283.68 286.44,288.55 289.52,294.49 292.60,301.69 295.69,309.76 298.77,318.21 301.85,326.53 304.93,334.29 308.01,341.22 311.09,347.44 314.17,353.12 317.25,358.43 320.33,363.53 323.41,368.44 326.49,373.02 329.57,377.14 332.66,380.67 335.74,383.50 338.82,385.55 341.90,386.80 344.98,387.20 348.06,386.74 351.14,385.44 354.22,383.49 357.30,381.12 360.38,378.53 363.46,375.93 366.54,373.53 369.62,371.60 372.71,370.40 375.79,370.18 378.87,371.11 381.95,373.17 385.03,376.14 388.11,379.77 391.19,383.85 394.27,388.15 397.35,392.55 400.43,396.93 403.51,401.22 406.59,405.35 409.68,409.28 412.76,413.06 415.84,416.76 418.92,420.45 422.00,424.21 425.08,428.00 428.16,431.65 431.24,434.95 434.32,437.72 437.40,439.79 440.48,441.03 443.56,441.34 446.64,440.62 449.73,438.79 452.81,435.83 455.89,431.84 458.97,427.02 462.05,421.55 465.13,415.60 468.21,409.35 471.29,402.98 474.37,396.66 477.45,390.53 480.53,384.73 483.61,379.47 486.70,375.09 489.78,371.92 492.86,370.25 495.94,370.34 499.02,372.09 502.10,375.06 505.18,378.82 508.26,382.97 511.34,387.15 514.42,391.16 517.50,394.91 520.58,398.31 523.66,401.30 526.75,403.89 529.83,406.19 532.91,408.38 535.99,410.62 539.07,413.06 542.15,415.74 545.23,418.52 548.31,421.26 551.39,423.80 554.47,426.01 557.55,427.88 560.63,429.45 563.72,430.82 566.80,432.04 569.88,433.18 572.96,434.25 576.04,435.27 579.12,436.22 582.20,437.09 585.28,437.94 588.36,438.97 591.44,440.42 594.52,442.52 597.60,445.47 600.68,449.24 603.77,453.43 606.85,457.61 609.93,461.40 613.01,464.43 616.09,466.54 619.17,467.78 622.25,468.17 625.33,467.80 628.41,466.71 631.49,464.98 634.57,462.63 637.65,459.74 640.74,456.33 643.82,452.47 646.90,448.26 649.98,443.82 653.06,439.25 656.14,434.66 659.22,430.16 662.30,425.94 665.38,422.17 668.46,419.01 671.54,416.60 674.62,414.94 677.70,413.98 680.79,413.63 683.87,413.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,95.64 73.87,95.72 76.95,95.88 80.03,96.06 83.11,96.22 86.19,96.31 89.27,96.49 92.35,97.14 95.43,98.62 98.51,101.26 101.59,105.31 104.68,110.52 107.76,116.36 110.84,122.30 113.92,127.88 117.00,132.73 120.08,136.85 123.16,140.33 126.24,143.30 129.32,145.88 132.40,148.12 135.48,149.98 138.56,151.40 141.65,152.30 144.73,152.64 147.81,152.49 150.89,152.10 153.97,151.68 157.05,151.44 160.13,151.57 163.21,152.12 166.29,153.09 169.37,154.45 172.45,156.18 175.53,158.26 178.61,160.73 181.70,163.65 184.78,167.06 187.86,170.99 190.94,175.37 194.02,179.84 197.10,184.04 200.18,187.63 203.26,190.33 206.34,192.22 209.42,193.76 212.50,195.43 215.58,197.67 218.67,200.84 221.75,204.91 224.83,209.65 227.91,214.79 230.99,220.08 234.07,225.36 237.15,230.62 240.23,235.94 243.31,241.38 246.39,247.01 249.47,252.84 252.55,258.73 255.63,264.53 258.72,270.10 261.80,275.32 264.88,280.18 267.96,284.75 271.04,289.14 274.12,293.42 277.20,297.67 280.28,301.94 283.36,306.25 286.44,310.61 289.52,315.02 292.60,319.46 295.69,323.73 298.77,327.58 301.85,330.79 304.93,333.16 308.01,334.72 311.09,335.91 314.17,337.21 317.25,339.06 320.33,341.87 323.41,345.71 326.49,350.33 329.57,355.46 332.66,360.83 335.74,366.21 338.82,371.30 341.90,375.81 344.98,379.46 348.06,382.03 351.14,383.36 354.22,383.55 357.30,382.78 360.38,381.22 363.46,379.02 366.54,376.40 369.62,373.63 372.71,371.00 375.79,368.76 378.87,367.12 381.95,366.35 385.03,366.71 388.11,368.45 391.19,371.80 394.27,376.89 397.35,383.35 400.43,390.56 403.51,397.93 406.59,404.93 409.68,411.14 412.76,416.59 415.84,421.41 418.92,425.77 422.00,429.79 425.08,433.59 428.16,437.11 431.24,440.33 434.32,443.19 437.40,445.64 440.48,447.53 443.56,448.60 446.64,448.62 449.73,447.37 452.81,444.67 455.89,440.63 458.97,435.45 462.05,429.38 465.13,422.60 468.21,415.35 471.29,407.86 474.37,400.40 477.45,393.17 480.53,386.37 483.61,380.19 486.70,374.84 489.78,370.49 492.86,367.30 495.94,365.40 499.02,364.81 502.10,365.46 505.18,367.24 508.26,370.07 511.34,373.86 514.42,378.43 517.50,383.56 520.58,389.06 523.66,394.75 526.75,400.47 529.83,406.03 532.91,411.27 535.99,416.05 539.07,420.22 542.15,423.75 545.23,426.73 548.31,429.27 551.39,431.47 554.47,433.42 557.55,435.17 560.63,436.68 563.72,437.95 566.80,438.92 569.88,439.60 572.96,440.06 576.04,440.39 579.12,440.70 582.20,441.08 585.28,441.61 588.36,442.27 591.44,443.05 594.52,443.92 597.60,444.85 600.68,445.85 603.77,446.94 606.85,448.14 609.93,449.48 613.01,450.99 616.09,452.57 619.17,454.06 622.25,455.29 625.33,456.10 628.41,456.39 631.49,456.24 634.57,455.82 637.65,455.30 640.74,454.84 643.82,454.54 646.90,454.30 649.98,453.96 653.06,453.41 656.14,452.50 659.22,451.18 662.30,449.47 665.38,447.43 668.46,445.12 671.54,442.57 674.62,439.84 677.70,436.98 680.79,434.02 683.87,431.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,122.59 73.87,123.98 76.95,126.85 80.03,130.52 83.11,134.30 86.19,137.58 89.27,139.95 92.35,141.25 95.43,141.41 98.51,140.34 101.59,138.05 104.68,134.92 107.76,131.55 110.84,128.52 113.92,126.34 117.00,125.39 120.08,125.63 123.16,126.89 126.24,128.97 129.32,131.70 132.40,134.91 135.48,138.54 138.56,142.50 141.65,146.76 144.73,151.25 147.81,155.77 150.89,159.90 153.97,163.28 157.05,165.55 160.13,166.47 163.21,166.32 166.29,165.66 169.37,165.06 172.45,165.01 175.53,165.84 178.61,167.26 181.70,168.80 184.78,170.00 187.86,170.42 190.94,169.98 194.02,169.18 197.10,168.59 200.18,168.78 203.26,170.24 206.34,173.19 209.42,177.63 212.50,183.49 215.58,190.69 218.67,199.11 221.75,208.23 224.83,217.32 227.91,225.68 230.99,232.71 234.07,238.02 237.15,241.94 240.23,245.03 243.31,247.83 246.39,250.84 249.47,254.34 252.55,258.26 255.63,262.45 258.72,266.78 261.80,271.09 264.88,275.30 267.96,279.39 271.04,283.35 274.12,287.17 277.20,290.88 280.28,294.59 283.36,298.51 286.44,302.80 289.52,307.64 292.60,313.11 295.69,319.06 298.77,325.26 301.85,331.50 304.93,337.59 308.01,343.34 311.09,348.65 314.17,353.41 317.25,357.53 320.33,360.94 323.41,363.63 326.49,365.65 329.57,367.06 332.66,367.92 335.74,368.28 338.82,368.19 341.90,367.71 344.98,366.89 348.06,365.76 351.14,364.43 354.22,363.21 357.30,362.48 360.38,362.57 363.46,363.78 366.54,366.23 369.62,369.70 372.71,373.92 375.79,378.64 378.87,383.61 381.95,388.69 385.03,393.79 388.11,398.87 391.19,403.89 394.27,408.79 397.35,413.51 400.43,417.92 403.51,421.93 406.59,425.45 409.68,428.42 412.76,430.86 415.84,432.80 418.92,434.29 422.00,435.36 425.08,436.02 428.16,436.22 431.24,435.91 434.32,435.03 437.40,433.54 440.48,431.47 443.56,428.91 446.64,425.96 449.73,422.70 452.81,419.23 455.89,415.60 458.97,411.90 462.05,408.18 465.13,404.48 468.21,400.89 471.29,397.59 474.37,394.79 477.45,392.67 480.53,391.41 483.61,391.00 486.70,391.19 489.78,391.67 492.86,392.18 495.94,392.45 499.02,392.45 502.10,392.28 505.18,392.08 508.26,391.98 511.34,392.10 514.42,392.60 517.50,393.65 520.58,395.38 523.66,397.95 526.75,401.36 529.83,405.33 532.91,409.46 535.99,413.41 539.07,416.86 542.15,419.63 545.23,421.85 548.31,423.66 551.39,425.21 554.47,426.63 557.55,427.96 560.63,429.13 563.72,430.07 566.80,430.71 569.88,431.00 572.96,431.01 576.04,430.87 579.12,430.71 582.20,430.64 585.28,430.78 588.36,431.22 591.44,432.08 594.52,433.46 597.60,435.44 600.68,437.96 603.77,440.78 606.85,443.61 609.93,446.22 613.01,448.38 616.09,449.96 619.17,450.94 622.25,451.33 625.33,451.13 628.41,450.35 631.49,449.02 634.57,447.19 637.65,444.90 640.74,442.20 643.82,439.18 646.90,436.10 649.98,433.28 653.06,430.98 656.14,429.45 659.22,428.69 662.30,428.31 665.38,427.87 668.46,426.98 671.54,425.28 674.62,422.75 677.70,419.68 680.79,416.35 683.87,413.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,78.28 73.87,78.33 76.95,78.60 80.03,79.24 83.11,80.43 86.19,82.28 89.27,84.90 92.35,88.30 95.43,92.52 98.51,97.57 101.59,103.43 104.68,109.88 107.76,116.58 110.84,123.20 113.92,129.45 117.00,135.09 120.08,140.01 123.16,144.12 126.24,147.38 129.32,149.73 132.40,151.19 135.48,151.84 138.56,151.79 141.65,151.14 144.73,149.96 147.81,148.40 150.89,146.61 153.97,144.75 157.05,142.95 160.13,141.34 163.21,140.13 166.29,139.54 169.37,139.80 172.45,141.09 175.53,143.55 178.61,147.13 181.70,151.74 184.78,157.31 187.86,163.72 190.94,170.76 194.02,177.86 197.10,184.49 200.18,190.12 203.26,194.34 206.34,197.14 209.42,198.98 212.50,200.35 215.58,201.70 218.67,203.44 221.75,205.74 224.83,208.70 227.91,212.34 230.99,216.71 234.07,221.79 237.15,227.56 240.23,233.93 243.31,240.86 246.39,248.28 249.47,256.01 252.55,263.59 255.63,270.57 258.72,276.52 261.80,281.08 264.88,284.43 267.96,287.27 271.04,290.33 274.12,294.26 277.20,299.59 280.28,306.16 283.36,313.42 286.44,320.82 289.52,327.83 292.60,334.07 295.69,339.47 298.77,344.09 301.85,347.99 304.93,351.27 308.01,353.93 311.09,355.89 314.17,357.03 317.25,357.27 320.33,356.52 323.41,354.89 326.49,352.68 329.57,350.19 332.66,347.70 335.74,345.46 338.82,343.75 341.90,342.88 344.98,343.11 348.06,344.66 351.14,347.61 354.22,351.58 357.30,356.04 360.38,360.52 363.46,364.56 366.54,367.91 369.62,370.64 372.71,372.87 375.79,374.74 378.87,376.38 381.95,378.05 385.03,380.12 388.11,382.97 391.19,386.90 394.27,392.17 397.35,398.52 400.43,405.47 403.51,412.56 406.59,419.33 409.68,425.45 412.76,430.81 415.84,435.37 418.92,439.13 422.00,442.10 425.08,444.26 428.16,445.58 431.24,446.00 434.32,445.50 437.40,444.03 440.48,441.64 443.56,438.43 446.64,434.51 449.73,429.97 452.81,424.92 455.89,419.62 458.97,414.43 462.05,409.65 465.13,405.56 468.21,402.36 471.29,400.05 474.37,398.53 477.45,397.72 480.53,397.53 483.61,397.82 486.70,398.37 489.78,398.95 492.86,399.38 495.94,399.47 499.02,399.22 502.10,398.75 505.18,398.22 508.26,397.75 511.34,397.47 514.42,397.41 517.50,397.58 520.58,397.96 523.66,398.54 526.75,399.32 529.83,400.31 532.91,401.55 535.99,403.06 539.07,404.85 542.15,406.99 545.23,409.58 548.31,412.71 551.39,416.49 554.47,420.98 557.55,426.06 560.63,431.39 563.72,436.67 566.80,441.61 569.88,445.94 572.96,449.48 576.04,452.08 579.12,453.64 582.20,454.04 585.28,453.30 588.36,451.71 591.44,449.65 594.52,447.47 597.60,445.49 600.68,443.95 603.77,442.94 606.85,442.54 609.93,442.81 613.01,443.77 616.09,445.27 619.17,446.98 622.25,448.58 625.33,449.79 628.41,450.34 631.49,450.09 634.57,448.98 637.65,446.93 640.74,443.90 643.82,439.95 646.90,435.51 649.98,431.03 653.06,426.96 656.14,423.70 659.22,421.42 662.30,419.89 665.38,418.88 668.46,418.12 671.54,417.39 674.62,416.49 677.70,415.26 680.79,413.54 683.87,411.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,119.53 73.87,119.05 76.95,118.01 80.03,116.60 83.11,115.01 86.19,113.42 89.27,112.05 92.35,111.13 95.43,110.92 98.51,111.62 101.59,113.38 104.68,116.21 107.76,120.03 110.84,124.72 113.92,130.19 117.00,136.29 120.08,142.59 123.16,148.62 126.24,153.92 129.32,158.11 132.40,160.98 135.48,162.66 138.56,163.33 141.65,163.19 144.73,162.41 147.81,161.22 150.89,159.86 153.97,158.56 157.05,157.55 160.13,156.98 163.21,156.93 166.29,157.42 169.37,158.43 172.45,159.96 175.53,161.96 178.61,164.20 181.70,166.44 184.78,168.43 187.86,169.96 190.94,170.95 194.02,171.58 197.10,172.07 200.18,172.61 203.26,173.38 206.34,174.59 209.42,176.41 212.50,179.01 215.58,182.53 218.67,187.08 221.75,192.55 224.83,198.71 227.91,205.35 230.99,212.27 234.07,219.27 237.15,226.12 240.23,232.60 243.31,238.53 246.39,243.72 249.47,248.13 252.55,251.94 255.63,255.35 258.72,258.54 261.80,261.71 264.88,265.02 267.96,268.68 271.04,272.84 274.12,277.66 277.20,283.25 280.28,289.59 283.36,296.58 286.44,304.11 289.52,312.09 292.60,320.40 295.69,328.83 298.77,337.16 301.85,345.19 304.93,352.72 308.01,359.57 311.09,365.50 314.17,370.29 317.25,373.73 320.33,375.68 323.41,376.20 326.49,375.63 329.57,374.27 332.66,372.44 335.74,370.41 338.82,368.35 341.90,366.37 344.98,364.58 348.06,363.05 351.14,361.84 354.22,361.06 357.30,360.79 360.38,361.09 363.46,362.04 366.54,363.64 369.62,365.77 372.71,368.31 375.79,371.15 378.87,374.18 381.95,377.46 385.03,381.19 388.11,385.54 391.19,390.72 394.27,396.84 397.35,403.67 400.43,410.80 403.51,417.85 406.59,424.46 409.68,430.29 412.76,435.01 415.84,438.35 418.92,440.03 422.00,439.85 425.08,437.87 428.16,434.72 431.24,431.04 434.32,427.47 437.40,424.53 440.48,422.34 443.56,420.57 446.64,418.87 449.73,416.90 452.81,414.37 455.89,411.29 458.97,407.79 462.05,404.04 465.13,400.17 468.21,396.35 471.29,392.73 474.37,389.49 477.45,386.78 480.53,384.73 483.61,383.38 486.70,382.66 489.78,382.48 492.86,382.75 495.94,383.37 499.02,384.36 502.10,385.82 505.18,387.83 508.26,390.49 511.34,393.88 514.42,397.92 517.50,402.53 520.58,407.58 523.66,412.98 526.75,418.59 529.83,424.07 532.91,429.07 535.99,433.25 539.07,436.32 542.15,438.20 545.23,439.17 548.31,439.53 551.39,439.59 554.47,439.62 557.55,439.73 560.63,439.87 563.72,439.97 566.80,439.96 569.88,439.80 572.96,439.51 576.04,439.17 579.12,438.86 582.20,438.66 585.28,438.61 588.36,438.77 591.44,439.15 594.52,439.79 597.60,440.70 600.68,441.86 603.77,443.17 606.85,444.54 609.93,445.87 613.01,447.09 616.09,448.23 619.17,449.46 622.25,450.91 625.33,452.74 628.41,455.02 631.49,457.37 634.57,459.23 637.65,460.06 640.74,459.36 643.82,456.85 646.90,452.76 649.98,447.47 653.06,441.34 656.14,434.73 659.22,428.02 662.30,421.68 665.38,416.12 668.46,411.73 671.54,408.83 674.62,407.42 677.70,407.23 680.79,407.97 683.87,409.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,150.34 73.87,149.54 76.95,147.78 80.03,145.32 83.11,142.45 86.19,139.42 89.27,136.48 92.35,133.84 95.43,131.72 98.51,130.28 101.59,129.65 104.68,129.72 107.76,130.25 110.84,130.99 113.92,131.73 117.00,132.32 120.08,132.83 123.16,133.43 126.24,134.26 129.32,135.47 132.40,137.08 135.48,138.87 138.56,140.59 141.65,142.01 144.73,142.93 147.81,143.42 150.89,143.88 153.97,144.68 157.05,146.18 160.13,148.64 163.21,151.86 166.29,155.35 169.37,158.64 172.45,161.28 175.53,162.97 178.61,163.89 181.70,164.30 184.78,164.50 187.86,164.75 190.94,165.31 194.02,166.41 197.10,168.24 200.18,170.97 203.26,174.77 206.34,179.59 209.42,185.24 212.50,191.51 215.58,198.21 218.67,205.15 221.75,212.23 224.83,219.37 227.91,226.52 230.99,233.63 234.07,240.63 237.15,247.33 240.23,253.53 243.31,259.04 246.39,263.70 249.47,267.47 252.55,270.63 255.63,273.45 258.72,276.21 261.80,279.14 264.88,282.38 267.96,285.89 271.04,289.67 274.12,293.68 277.20,297.85 280.28,301.94 283.36,305.60 286.44,308.48 289.52,310.30 292.60,310.95 295.69,310.97 298.77,311.08 301.85,311.93 304.93,314.16 308.01,318.00 311.09,323.12 314.17,329.04 317.25,335.35 320.33,341.63 323.41,347.61 326.49,353.15 329.57,358.16 332.66,362.54 335.74,366.25 338.82,369.41 341.90,372.20 344.98,374.82 348.06,377.45 351.14,380.20 354.22,382.95 357.30,385.55 360.38,387.83 363.46,389.64 366.54,390.91 369.62,391.69 372.71,392.03 375.79,392.00 378.87,391.67 381.95,391.20 385.03,390.81 388.11,390.73 391.19,391.15 394.27,392.22 397.35,393.83 400.43,395.72 403.51,397.64 406.59,399.35 409.68,400.70 412.76,401.76 415.84,402.65 418.92,403.51 422.00,404.46 425.08,405.58 428.16,406.88 431.24,408.35 434.32,409.97 437.40,411.73 440.48,413.59 443.56,415.50 446.64,417.41 449.73,419.25 452.81,420.98 455.89,422.44 458.97,423.40 462.05,423.69 465.13,423.12 468.21,421.62 471.29,419.35 474.37,416.58 477.45,413.54 480.53,410.44 483.61,407.49 486.70,404.86 489.78,402.70 492.86,401.14 495.94,400.28 499.02,400.15 502.10,400.72 505.18,401.95 508.26,403.77 511.34,406.14 514.42,408.93 517.50,411.97 520.58,415.10 523.66,418.20 526.75,421.12 529.83,423.65 532.91,425.57 535.99,426.68 539.07,426.82 542.15,426.03 545.23,424.65 548.31,423.08 551.39,421.67 554.47,420.77 557.55,420.51 560.63,420.88 563.72,421.84 566.80,423.36 569.88,425.35 572.96,427.63 576.04,429.91 579.12,431.94 582.20,433.51 585.28,434.50 588.36,435.22 591.44,436.05 594.52,437.34 597.60,439.43 600.68,442.39 603.77,445.88 606.85,449.50 609.93,452.88 613.01,455.69 616.09,457.75 619.17,459.10 622.25,459.75 625.33,459.74 628.41,459.12 631.49,457.95 634.57,456.30 637.65,454.23 640.74,451.78 643.82,449.05 646.90,446.19 649.98,443.35 653.06,440.69 656.14,438.34 659.22,436.30 662.30,434.32 665.38,432.16 668.46,429.57 671.54,426.35 674.62,422.43 677.70,417.89 680.79,412.81 683.87,407.27 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,135.02 73.87,134.27 76.95,132.69 80.03,130.65 83.11,128.50 86.19,126.56 89.27,125.04 92.35,124.02 95.43,123.57 98.51,123.71 101.59,124.49 104.68,125.95 107.76,128.17 110.84,131.21 113.92,135.12 117.00,139.87 120.08,145.13 123.16,150.46 126.24,155.49 129.32,159.86 132.40,163.35 135.48,166.00 138.56,167.87 141.65,169.04 144.73,169.61 147.81,169.58 150.89,168.91 153.97,167.56 157.05,165.47 160.13,162.65 163.21,159.45 166.29,156.44 169.37,154.17 172.45,153.10 175.53,153.55 178.61,155.19 181.70,157.55 184.78,160.16 187.86,162.59 190.94,164.65 194.02,166.62 197.10,168.83 200.18,171.60 203.26,175.24 206.34,179.80 209.42,185.09 212.50,190.92 215.58,197.10 218.67,203.46 221.75,209.87 224.83,216.28 227.91,222.62 230.99,228.85 234.07,234.91 237.15,240.63 240.23,245.84 243.31,250.38 246.39,254.11 249.47,257.05 252.55,259.57 255.63,262.03 258.72,264.81 261.80,268.21 264.88,272.37 267.96,277.20 271.04,282.60 274.12,288.48 277.20,294.74 280.28,301.19 283.36,307.64 286.44,313.91 289.52,319.83 292.60,325.25 295.69,330.04 298.77,334.09 301.85,337.30 304.93,339.59 308.01,341.00 311.09,341.84 314.17,342.43 317.25,343.07 320.33,344.02 323.41,345.41 326.49,347.24 329.57,349.47 332.66,352.06 335.74,354.97 338.82,358.00 341.90,360.90 344.98,363.44 348.06,365.40 351.14,366.68 354.22,367.46 357.30,368.04 360.38,368.67 363.46,369.62 366.54,371.05 369.62,373.02 372.71,375.55 375.79,378.65 378.87,382.34 381.95,386.52 385.03,391.00 388.11,395.63 391.19,400.24 394.27,404.67 397.35,408.70 400.43,412.11 403.51,414.65 406.59,416.15 409.68,416.53 412.76,416.17 415.84,415.51 418.92,415.02 422.00,415.08 425.08,415.90 428.16,417.34 431.24,419.23 434.32,421.37 437.40,423.58 440.48,425.71 443.56,427.62 446.64,429.19 449.73,430.31 452.81,430.88 455.89,430.78 458.97,429.86 462.05,428.01 465.13,425.11 468.21,421.17 471.29,416.55 474.37,411.69 477.45,407.03 480.53,402.93 483.61,399.60 486.70,396.95 489.78,394.81 492.86,393.05 495.94,391.51 499.02,390.19 502.10,389.16 505.18,388.52 508.26,388.36 511.34,388.75 514.42,389.71 517.50,391.23 520.58,393.30 523.66,395.89 526.75,398.98 529.83,402.47 532.91,406.24 535.99,410.19 539.07,414.24 542.15,418.33 545.23,422.43 548.31,426.55 551.39,430.68 554.47,434.81 557.55,438.85 560.63,442.61 563.72,445.90 566.80,448.57 569.88,450.47 572.96,451.56 576.04,451.86 579.12,451.39 582.20,450.18 585.28,448.33 588.36,446.25 591.44,444.36 594.52,443.09 597.60,442.81 600.68,443.59 603.77,445.08 606.85,446.84 609.93,448.48 613.01,449.63 616.09,450.20 619.17,450.34 622.25,450.19 625.33,449.93 628.41,449.68 631.49,449.33 634.57,448.68 637.65,447.54 640.74,445.73 643.82,443.15 646.90,440.02 649.98,436.58 653.06,433.08 656.14,429.74 659.22,426.71 662.30,424.01 665.38,421.61 668.46,419.51 671.54,417.68 674.62,416.20 677.70,415.18 680.79,414.76 683.87,415.04 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,93.97 73.87,94.87 76.95,96.88 80.03,99.79 83.11,103.35 86.19,107.31 89.27,111.45 92.35,115.56 95.43,119.44 98.51,122.93 101.59,125.91 104.68,128.47 107.76,130.79 110.84,133.10 113.92,135.56 117.00,138.29 120.08,141.13 123.16,143.84 126.24,146.18 129.32,147.93 132.40,148.95 135.48,149.17 138.56,148.53 141.65,147.02 144.73,144.62 147.81,141.63 150.89,138.71 153.97,136.45 157.05,135.44 160.13,136.11 163.21,138.37 166.29,141.79 169.37,145.93 172.45,150.40 175.53,154.84 178.61,159.08 181.70,162.99 184.78,166.48 187.86,169.47 190.94,171.99 194.02,174.27 197.10,176.57 200.18,179.10 203.26,182.08 206.34,185.53 209.42,189.34 212.50,193.34 215.58,197.41 218.67,201.42 221.75,205.42 224.83,209.56 227.91,213.95 230.99,218.73 234.07,223.97 237.15,229.64 240.23,235.63 243.31,241.86 246.39,248.24 249.47,254.70 252.55,261.12 255.63,267.43 258.72,273.54 261.80,279.38 264.88,284.95 267.96,290.32 271.04,295.55 274.12,300.73 277.20,305.88 280.28,310.88 283.36,315.49 286.44,319.52 289.52,322.75 292.60,325.11 295.69,326.92 298.77,328.62 301.85,330.59 304.93,333.22 308.01,336.64 311.09,340.53 314.17,344.56 317.25,348.37 320.33,351.66 323.41,354.32 326.49,356.43 329.57,358.11 332.66,359.47 335.74,360.62 338.82,361.87 341.90,363.59 344.98,366.12 348.06,369.79 351.14,374.69 354.22,380.27 357.30,385.78 360.38,390.53 363.46,393.88 366.54,395.59 369.62,396.13 372.71,396.05 375.79,395.89 378.87,396.12 381.95,396.97 385.03,398.34 388.11,400.13 391.19,402.23 394.27,404.51 397.35,406.68 400.43,408.41 403.51,409.36 406.59,409.24 409.68,407.94 412.76,405.85 415.84,403.51 418.92,401.44 422.00,400.10 425.08,399.73 428.16,400.16 431.24,401.17 434.32,402.51 437.40,403.99 440.48,405.42 443.56,406.68 446.64,407.69 449.73,408.33 452.81,408.56 455.89,408.41 458.97,407.96 462.05,407.29 465.13,406.50 468.21,405.66 471.29,404.81 474.37,403.99 477.45,403.24 480.53,402.58 483.61,402.06 486.70,401.74 489.78,401.68 492.86,401.95 495.94,402.58 499.02,403.56 502.10,404.80 505.18,406.19 508.26,407.66 511.34,409.13 514.42,410.61 517.50,412.17 520.58,413.85 523.66,415.70 526.75,417.74 529.83,419.84 532.91,421.87 535.99,423.68 539.07,425.14 542.15,426.21 545.23,426.99 548.31,427.59 551.39,428.13 554.47,428.69 557.55,429.33 560.63,430.01 563.72,430.71 566.80,431.40 569.88,432.08 572.96,432.78 576.04,433.60 579.12,434.62 582.20,435.92 585.28,437.51 588.36,439.28 591.44,441.05 594.52,442.67 597.60,444.01 600.68,444.95 603.77,445.47 606.85,445.53 609.93,445.11 613.01,444.20 616.09,442.90 619.17,441.34 622.25,439.70 625.33,438.09 628.41,436.65 631.49,435.33 634.57,434.06 637.65,432.72 640.74,431.25 643.82,429.60 646.90,427.90 649.98,426.30 653.06,424.97 656.14,424.04 659.22,423.55 662.30,423.33 665.38,423.24 668.46,423.11 671.54,422.80 674.62,422.28 677.70,421.61 680.79,420.86 683.87,420.08 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,189.09 73.87,188.49 76.95,187.03 80.03,184.72 83.11,181.61 86.19,177.73 89.27,173.31 92.35,168.75 95.43,164.45 98.51,160.75 101.59,157.94 104.68,155.88 107.76,154.20 110.84,152.52 113.92,150.52 117.00,147.95 120.08,144.97 123.16,141.89 126.24,138.95 129.32,136.43 132.40,134.48 135.48,133.09 138.56,132.22 141.65,131.82 144.73,131.84 147.81,132.32 150.89,133.39 153.97,135.19 157.05,137.81 160.13,141.35 163.21,145.51 166.29,149.85 169.37,153.92 172.45,157.32 175.53,159.80 178.61,161.58 181.70,163.00 184.78,164.41 187.86,166.13 190.94,168.39 194.02,171.30 197.10,174.91 200.18,179.28 203.26,184.44 206.34,190.18 209.42,196.11 212.50,201.80 215.58,206.91 218.67,211.13 221.75,214.50 224.83,217.25 227.91,219.60 230.99,221.78 234.07,223.99 237.15,226.46 240.23,229.38 243.31,232.93 246.39,237.26 249.47,242.38 252.55,248.05 255.63,253.98 258.72,259.92 261.80,265.64 264.88,271.06 267.96,276.27 271.04,281.39 274.12,286.50 277.20,291.72 280.28,297.13 283.36,302.83 286.44,308.91 289.52,315.42 292.60,322.37 295.69,329.49 298.77,336.43 301.85,342.88 304.93,348.56 308.01,353.28 311.09,357.06 314.17,359.95 317.25,362.01 320.33,363.30 323.41,364.02 326.49,364.49 329.57,365.02 332.66,365.89 335.74,367.31 338.82,369.15 341.90,371.10 344.98,372.83 348.06,374.05 351.14,374.59 354.22,374.62 357.30,374.44 360.38,374.32 363.46,374.51 366.54,375.20 369.62,376.46 372.71,378.33 375.79,380.84 378.87,383.99 381.95,387.64 385.03,391.52 388.11,395.33 391.19,398.83 394.27,401.80 397.35,404.19 400.43,406.02 403.51,407.34 406.59,408.19 409.68,408.68 412.76,409.08 415.84,409.73 418.92,410.91 422.00,412.89 425.08,415.68 428.16,418.81 431.24,421.78 434.32,424.12 437.40,425.40 440.48,425.46 443.56,424.37 446.64,422.25 449.73,419.19 452.81,415.34 455.89,410.94 458.97,406.31 462.05,401.72 465.13,397.43 468.21,393.68 471.29,390.74 474.37,388.83 477.45,388.17 480.53,388.93 483.61,391.02 486.70,393.87 489.78,396.88 492.86,399.48 495.94,401.17 499.02,401.93 502.10,402.12 505.18,402.14 508.26,402.37 511.34,403.13 514.42,404.35 517.50,405.77 520.58,407.14 523.66,408.22 526.75,408.85 529.83,409.10 532.91,409.11 535.99,409.02 539.07,408.96 542.15,409.05 545.23,409.38 548.31,410.04 551.39,411.11 554.47,412.63 557.55,414.62 560.63,416.99 563.72,419.67 566.80,422.59 569.88,425.68 572.96,428.87 576.04,432.08 579.12,435.26 582.20,438.33 585.28,441.23 588.36,443.86 591.44,446.12 594.52,447.90 597.60,449.12 600.68,449.80 603.77,450.12 606.85,450.25 609.93,450.39 613.01,450.67 616.09,451.17 619.17,451.84 622.25,452.64 625.33,453.51 628.41,454.40 631.49,455.22 634.57,455.85 637.65,456.21 640.74,456.19 643.82,455.71 646.90,454.72 649.98,453.14 653.06,450.93 656.14,448.04 659.22,444.53 662.30,440.66 665.38,436.66 668.46,432.76 671.54,429.18 674.62,426.11 677.70,423.71 680.79,422.15 683.87,421.55 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,109.10 73.87,109.11 76.95,109.19 80.03,109.43 83.11,109.89 86.19,110.64 89.27,111.71 92.35,113.07 95.43,114.71 98.51,116.61 101.59,118.74 104.68,120.92 107.76,122.93 110.84,124.55 113.92,125.59 117.00,125.95 120.08,125.94 123.16,125.94 126.24,126.33 129.32,127.44 132.40,129.45 135.48,132.13 138.56,135.24 141.65,138.54 144.73,141.80 147.81,144.84 150.89,147.56 153.97,149.87 157.05,151.71 160.13,153.01 163.21,153.89 166.29,154.53 169.37,155.11 172.45,155.79 175.53,156.71 178.61,157.94 181.70,159.52 184.78,161.49 187.86,163.88 190.94,166.64 194.02,169.55 197.10,172.41 200.18,175.01 203.26,177.19 206.34,179.11 209.42,181.26 212.50,184.16 215.58,188.24 218.67,193.87 221.75,200.71 224.83,208.09 227.91,215.34 230.99,221.85 234.07,227.21 237.15,231.62 240.23,235.46 243.31,239.12 246.39,242.95 249.47,247.19 252.55,251.82 255.63,256.81 258.72,262.08 261.80,267.58 264.88,273.29 267.96,279.20 271.04,285.32 274.12,291.65 277.20,298.20 280.28,304.85 283.36,311.47 286.44,317.92 289.52,324.06 292.60,329.81 295.69,335.14 298.77,340.05 301.85,344.55 304.93,348.64 308.01,352.33 311.09,355.59 314.17,358.41 317.25,360.77 320.33,362.65 323.41,364.05 326.49,365.01 329.57,365.55 332.66,365.69 335.74,365.48 338.82,365.04 341.90,364.53 344.98,364.12 348.06,363.93 351.14,364.11 354.22,364.80 357.30,366.13 360.38,368.23 363.46,371.19 366.54,374.97 369.62,379.25 372.71,383.68 375.79,387.97 378.87,391.81 381.95,395.14 385.03,398.11 388.11,400.86 391.19,403.54 394.27,406.30 397.35,409.23 400.43,412.39 403.51,415.83 406.59,419.61 409.68,423.71 412.76,427.99 415.84,432.25 418.92,436.32 422.00,440.03 425.08,443.25 428.16,445.88 431.24,447.86 434.32,449.10 437.40,449.57 440.48,449.23 443.56,448.08 446.64,446.11 449.73,443.34 452.81,439.77 455.89,435.39 458.97,430.22 462.05,424.26 465.13,417.51 468.21,410.08 471.29,402.42 474.37,395.04 477.45,388.42 480.53,382.99 483.61,378.93 486.70,375.99 489.78,373.88 492.86,372.31 495.94,371.01 499.02,369.82 502.10,368.76 505.18,367.83 508.26,367.05 511.34,366.44 514.42,366.10 517.50,366.13 520.58,366.65 523.66,367.76 526.75,369.51 529.83,371.87 532.91,374.78 535.99,378.17 539.07,381.98 542.15,386.17 545.23,390.71 548.31,395.57 551.39,400.73 554.47,406.17 557.55,411.85 560.63,417.67 563.72,423.56 566.80,429.44 569.88,435.25 572.96,440.79 576.04,445.85 579.12,450.22 582.20,453.73 585.28,456.23 588.36,457.72 591.44,458.25 594.52,457.84 597.60,456.54 600.68,454.47 603.77,451.87 606.85,448.97 609.93,446.00 613.01,443.16 616.09,440.61 619.17,438.49 622.25,436.94 625.33,436.05 628.41,435.89 631.49,436.34 634.57,437.22 637.65,438.32 640.74,439.48 643.82,440.56 646.90,441.59 649.98,442.61 653.06,443.68 656.14,444.86 659.22,446.12 662.30,447.30 665.38,448.24 668.46,448.78 671.54,448.79 674.62,448.25 677.70,447.25 680.79,445.88 683.87,444.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,66.51 73.87,67.21 76.95,68.81 80.03,71.19 83.11,74.18 86.19,77.64 89.27,81.55 92.35,85.98 95.43,91.03 98.51,96.81 101.59,103.36 104.68,110.53 107.76,118.02 110.84,125.55 113.92,132.85 117.00,139.66 120.08,145.46 123.16,149.75 126.24,152.05 129.32,151.94 132.40,149.44 135.48,145.46 138.56,140.96 141.65,136.86 144.73,133.99 147.81,132.72 150.89,132.97 153.97,134.59 157.05,137.44 160.13,141.32 163.21,145.80 166.29,150.36 169.37,154.50 172.45,157.79 175.53,159.91 178.61,161.01 181.70,161.34 184.78,161.16 187.86,160.74 190.94,160.39 194.02,160.59 197.10,161.83 200.18,164.51 203.26,169.00 206.34,175.29 209.42,183.01 212.50,191.77 215.58,201.19 218.67,210.94 221.75,220.68 224.83,230.11 227.91,238.96 230.99,247.02 234.07,254.06 237.15,259.86 240.23,264.22 243.31,266.96 246.39,267.91 249.47,267.22 252.55,265.60 255.63,263.79 258.72,262.50 261.80,262.33 264.88,263.59 267.96,266.27 271.04,270.31 274.12,275.61 277.20,282.07 280.28,289.38 283.36,297.11 286.44,304.89 289.52,312.36 292.60,319.24 295.69,325.48 298.77,331.06 301.85,335.99 304.93,340.30 308.01,344.00 311.09,347.10 314.17,349.61 317.25,351.53 320.33,352.88 323.41,353.77 326.49,354.41 329.57,355.03 332.66,355.82 335.74,356.93 338.82,358.38 341.90,360.12 344.98,362.06 348.06,364.13 351.14,366.31 354.22,368.63 357.30,371.17 360.38,374.00 363.46,377.19 366.54,380.67 369.62,384.14 372.71,387.29 375.79,389.83 378.87,391.50 381.95,392.45 385.03,393.18 388.11,394.20 391.19,396.00 394.27,398.95 397.35,402.99 400.43,407.84 403.51,413.19 406.59,418.76 409.68,424.26 412.76,429.35 415.84,433.68 418.92,436.94 422.00,438.86 425.08,439.35 428.16,438.61 431.24,436.86 434.32,434.33 437.40,431.25 440.48,427.71 443.56,423.77 446.64,419.43 449.73,414.71 452.81,409.62 455.89,404.43 458.97,399.48 462.05,395.10 465.13,391.59 468.21,389.16 471.29,387.85 474.37,387.62 477.45,388.43 480.53,390.24 483.61,392.83 486.70,395.72 489.78,398.41 492.86,400.44 495.94,401.43 499.02,401.37 502.10,400.64 505.18,399.63 508.26,398.72 511.34,398.21 514.42,398.15 517.50,398.47 520.58,399.07 523.66,399.85 526.75,400.74 529.83,401.77 532.91,402.98 535.99,404.41 539.07,406.12 542.15,408.17 545.23,410.74 548.31,413.96 551.39,417.99 554.47,422.94 557.55,428.71 560.63,435.01 563.72,441.55 566.80,448.07 569.88,454.30 572.96,459.92 576.04,464.58 579.12,467.97 582.20,469.81 585.28,469.98 588.36,468.84 591.44,466.88 594.52,464.54 597.60,462.24 600.68,460.21 603.77,458.38 606.85,456.65 609.93,454.89 613.01,452.98 616.09,450.89 619.17,448.65 622.25,446.28 625.33,443.83 628.41,441.32 631.49,438.81 634.57,436.36 637.65,434.02 640.74,431.85 643.82,429.88 646.90,428.12 649.98,426.59 653.06,425.28 656.14,424.21 659.22,423.33 662.30,422.57 665.38,421.85 668.46,421.10 671.54,420.23 674.62,419.27 677.70,418.24 680.79,417.22 683.87,416.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,141.90 73.87,140.53 76.95,137.58 80.03,133.57 83.11,129.04 86.19,124.48 89.27,120.31 92.35,116.83 95.43,114.32 98.51,112.99 101.59,113.01 104.68,114.32 107.76,116.72 110.84,120.01 113.92,124.01 117.00,128.52 120.08,133.32 123.16,138.19 126.24,142.91 129.32,147.32 132.40,151.27 135.48,154.66 138.56,157.39 141.65,159.40 144.73,160.63 147.81,161.11 150.89,160.94 153.97,160.22 157.05,159.06 160.13,157.56 163.21,155.95 166.29,154.49 169.37,153.47 172.45,153.10 175.53,153.55 178.61,154.78 181.70,156.68 184.78,159.16 187.86,162.11 190.94,165.46 194.02,169.22 197.10,173.41 200.18,178.07 203.26,183.20 206.34,188.70 209.42,194.36 212.50,199.97 215.58,205.33 218.67,210.28 221.75,214.77 224.83,218.84 227.91,222.54 230.99,225.89 234.07,228.98 237.15,232.01 240.23,235.20 243.31,238.77 246.39,242.89 249.47,247.62 252.55,252.73 255.63,258.00 258.72,263.17 261.80,268.05 264.88,272.60 267.96,276.94 271.04,281.24 274.12,285.62 277.20,290.21 280.28,294.92 283.36,299.59 286.44,304.04 289.52,308.13 292.60,311.78 295.69,315.19 298.77,318.66 301.85,322.45 304.93,326.80 308.01,331.74 311.09,336.85 314.17,341.67 317.25,345.79 320.33,348.82 323.41,350.71 326.49,351.68 329.57,352.02 332.66,351.96 335.74,351.77 338.82,351.78 341.90,352.38 344.98,353.89 348.06,356.63 351.14,360.71 354.22,365.70 357.30,371.01 360.38,376.08 363.46,380.39 366.54,383.73 369.62,386.38 372.71,388.68 375.79,390.97 378.87,393.57 381.95,396.54 385.03,399.72 388.11,402.93 391.19,406.00 394.27,408.76 397.35,411.20 400.43,413.33 403.51,415.21 406.59,416.86 409.68,418.35 412.76,419.80 415.84,421.35 418.92,423.12 422.00,425.24 425.08,427.68 428.16,430.20 431.24,432.55 434.32,434.48 437.40,435.77 440.48,436.29 443.56,435.99 446.64,434.85 449.73,432.86 452.81,430.02 455.89,426.53 458.97,422.66 462.05,418.67 465.13,414.79 468.21,411.21 471.29,407.95 474.37,405.02 477.45,402.39 480.53,400.04 483.61,397.96 486.70,396.17 489.78,394.70 492.86,393.56 495.94,392.78 499.02,392.31 502.10,392.08 505.18,392.00 508.26,392.00 511.34,392.00 514.42,392.02 517.50,392.08 520.58,392.22 523.66,392.47 526.75,392.87 529.83,393.44 532.91,394.21 535.99,395.21 539.07,396.46 542.15,397.97 545.23,399.75 548.31,401.78 551.39,404.07 554.47,406.62 557.55,409.50 560.63,412.86 563.72,416.85 566.80,421.60 569.88,427.18 572.96,433.34 576.04,439.69 579.12,445.86 582.20,451.50 585.28,456.34 588.36,460.29 591.44,463.32 594.52,465.41 597.60,466.55 600.68,466.81 603.77,466.35 606.85,465.33 609.93,463.90 613.01,462.20 616.09,460.36 619.17,458.46 622.25,456.60 625.33,454.83 628.41,453.21 631.49,451.64 634.57,449.98 637.65,448.08 640.74,445.81 643.82,443.11 646.90,440.17 649.98,437.21 653.06,434.45 656.14,432.10 659.22,430.20 662.30,428.57 665.38,427.01 668.46,425.30 671.54,423.27 674.62,420.95 677.70,418.50 680.79,416.12 683.87,413.98 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,125.45 73.87,124.37 76.95,122.08 80.03,119.00 83.11,115.55 86.19,112.14 89.27,109.26 92.35,107.45 95.43,107.20 98.51,108.94 101.59,113.01 104.68,119.06 107.76,126.38 110.84,134.31 113.92,142.20 117.00,149.53 120.08,155.99 123.16,161.39 126.24,165.56 129.32,168.38 132.40,169.80 135.48,169.97 138.56,169.01 141.65,167.07 144.73,164.30 147.81,160.86 150.89,157.00 153.97,152.94 157.05,148.88 160.13,144.98 163.21,141.57 166.29,138.98 169.37,137.53 172.45,137.51 175.53,139.07 178.61,141.86 181.70,145.43 184.78,149.34 187.86,153.19 190.94,156.77 194.02,160.25 197.10,163.83 200.18,167.73 203.26,172.12 206.34,177.10 209.42,182.61 212.50,188.61 215.58,195.02 218.67,201.79 221.75,208.67 224.83,215.36 227.91,221.55 230.99,226.99 234.07,231.53 237.15,235.36 240.23,238.79 243.31,242.12 246.39,245.60 249.47,249.41 252.55,253.56 255.63,258.00 258.72,262.71 261.80,267.63 264.88,272.70 267.96,277.83 271.04,282.95 274.12,287.98 277.20,292.87 280.28,297.64 283.36,302.39 286.44,307.20 289.52,312.14 292.60,317.26 295.69,322.50 298.77,327.78 301.85,333.01 304.93,338.12 308.01,343.02 311.09,347.66 314.17,351.98 317.25,355.92 320.33,359.44 323.41,362.41 326.49,364.66 329.57,366.00 332.66,366.30 335.74,365.45 338.82,363.85 341.90,362.12 344.98,360.86 348.06,360.60 351.14,361.71 354.22,363.95 357.30,366.92 360.38,370.24 363.46,373.54 366.54,376.55 369.62,379.23 372.71,381.53 375.79,383.45 378.87,385.00 381.95,386.32 385.03,387.73 388.11,389.51 391.19,391.93 394.27,395.20 397.35,399.16 400.43,403.50 403.51,407.89 406.59,412.05 409.68,415.77 412.76,419.17 415.84,422.43 418.92,425.74 422.00,429.29 425.08,433.04 428.16,436.62 431.24,439.62 434.32,441.64 437.40,442.35 440.48,441.67 443.56,439.80 446.64,436.93 449.73,433.27 452.81,429.02 455.89,424.47 458.97,419.94 462.05,415.73 465.13,412.11 468.21,409.24 471.29,407.01 474.37,405.24 477.45,403.75 480.53,402.36 483.61,401.00 486.70,399.79 489.78,398.85 492.86,398.32 495.94,398.31 499.02,398.84 502.10,399.84 505.18,401.25 508.26,402.98 511.34,404.99 514.42,407.17 517.50,409.43 520.58,411.68 523.66,413.85 526.75,415.84 529.83,417.50 532.91,418.66 535.99,419.16 539.07,418.88 542.15,417.87 545.23,416.51 548.31,415.19 551.39,414.27 554.47,414.09 557.55,414.70 560.63,415.92 563.72,417.54 566.80,419.37 569.88,421.25 572.96,423.26 576.04,425.59 579.12,428.44 582.20,431.96 585.28,436.24 588.36,441.00 591.44,445.87 594.52,450.54 597.60,454.69 600.68,458.08 603.77,460.60 606.85,462.14 609.93,462.61 613.01,461.97 616.09,460.36 619.17,458.09 622.25,455.47 625.33,452.79 628.41,450.27 631.49,447.92 634.57,445.60 637.65,443.20 640.74,440.58 643.82,437.67 646.90,434.55 649.98,431.30 653.06,428.02 656.14,424.81 659.22,421.80 662.30,419.15 665.38,417.04 668.46,415.64 671.54,415.05 674.62,415.19 677.70,415.77 680.79,416.51 683.87,417.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,119.22 73.87,119.33 76.95,119.64 80.03,120.22 83.11,121.12 86.19,122.39 89.27,123.96 92.35,125.64 95.43,127.27 98.51,128.67 101.59,129.72 104.68,130.52 107.76,131.28 110.84,132.23 113.92,133.55 117.00,135.36 120.08,137.39 123.16,139.27 126.24,140.68 129.32,141.30 132.40,141.00 135.48,139.98 138.56,138.49 141.65,136.77 144.73,135.05 147.81,133.57 150.89,132.56 153.97,132.27 157.05,132.86 160.13,134.50 163.21,137.05 166.29,140.24 169.37,143.80 172.45,147.49 175.53,151.12 178.61,154.76 181.70,158.51 184.78,162.49 187.86,166.82 190.94,171.54 194.02,176.55 197.10,181.74 200.18,187.02 203.26,192.28 206.34,197.54 209.42,202.91 212.50,208.48 215.58,214.37 218.67,220.64 221.75,226.94 224.83,232.74 227.91,237.53 230.99,240.86 234.07,242.47 237.15,242.78 240.23,242.41 243.31,241.93 246.39,241.89 249.47,242.71 252.55,244.56 255.63,247.58 258.72,251.86 261.80,257.47 264.88,264.11 267.96,271.13 271.04,277.89 274.12,283.81 277.20,288.44 280.28,292.02 283.36,295.20 286.44,298.60 289.52,302.80 292.60,308.17 295.69,314.33 298.77,320.70 301.85,326.74 304.93,331.91 308.01,335.97 311.09,339.12 314.17,341.62 317.25,343.76 320.33,345.77 323.41,347.82 326.49,349.96 329.57,352.22 332.66,354.63 335.74,357.20 338.82,359.94 341.90,362.86 344.98,365.96 348.06,369.25 351.14,372.69 354.22,376.23 357.30,379.76 360.38,383.21 363.46,386.49 366.54,389.59 369.62,392.55 372.71,395.43 375.79,398.29 378.87,401.19 381.95,404.10 385.03,406.92 388.11,409.55 391.19,411.89 394.27,413.87 397.35,415.53 400.43,417.00 403.51,418.38 406.59,419.78 409.68,421.28 412.76,422.89 415.84,424.60 418.92,426.42 422.00,428.32 425.08,430.20 428.16,431.78 431.24,432.79 434.32,432.97 437.40,432.08 440.48,430.15 443.56,427.39 446.64,424.05 449.73,420.35 452.81,416.49 455.89,412.52 458.97,408.39 462.05,404.06 465.13,399.50 468.21,394.69 471.29,389.76 474.37,384.87 477.45,380.18 480.53,375.83 483.61,371.96 486.70,368.75 489.78,366.36 492.86,364.95 495.94,364.64 499.02,365.39 502.10,367.06 505.18,369.48 508.26,372.50 511.34,375.97 514.42,379.81 517.50,383.94 520.58,388.31 523.66,392.87 526.75,397.57 529.83,402.30 532.91,406.98 535.99,411.51 539.07,415.81 542.15,419.84 545.23,423.59 548.31,427.09 551.39,430.35 554.47,433.38 557.55,436.20 560.63,438.82 563.72,441.26 566.80,443.52 569.88,445.62 572.96,447.58 576.04,449.40 579.12,451.12 582.20,452.75 585.28,454.33 588.36,455.97 591.44,457.81 594.52,459.99 597.60,462.60 600.68,465.60 603.77,468.67 606.85,471.49 609.93,473.73 613.01,475.14 616.09,475.56 619.17,474.99 622.25,473.44 625.33,470.92 628.41,467.50 631.49,463.44 634.57,459.11 637.65,454.86 640.74,451.00 643.82,447.73 646.90,444.95 649.98,442.48 653.06,440.15 656.14,437.78 659.22,435.26 662.30,432.62 665.38,429.88 668.46,427.06 671.54,424.20 674.62,421.34 677.70,418.51 680.79,415.75 683.87,413.09 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,149.50 73.87,149.69 76.95,150.04 80.03,150.40 83.11,150.63 86.19,150.59 89.27,150.24 92.35,149.59 95.43,148.67 98.51,147.51 101.59,146.15 104.68,144.73 107.76,143.42 110.84,142.38 113.92,141.77 117.00,141.69 120.08,142.15 123.16,143.12 126.24,144.56 129.32,146.44 132.40,148.66 135.48,150.94 138.56,153.02 141.65,154.65 144.73,155.63 147.81,155.92 150.89,155.65 153.97,154.99 157.05,154.08 160.13,153.08 163.21,152.20 166.29,151.69 169.37,151.75 172.45,152.58 175.53,154.29 178.61,156.65 181.70,159.39 184.78,162.21 187.86,164.86 190.94,167.24 194.02,169.57 197.10,172.09 200.18,175.05 203.26,178.67 206.34,183.01 209.42,187.96 212.50,193.41 215.58,199.25 218.67,205.36 221.75,211.46 224.83,217.21 227.91,222.29 230.99,226.41 234.07,229.41 237.15,231.62 240.23,233.47 243.31,235.36 246.39,237.67 249.47,240.66 252.55,244.34 255.63,248.66 258.72,253.58 261.80,259.06 264.88,265.03 267.96,271.48 271.04,278.38 274.12,285.70 277.20,293.40 280.28,301.33 283.36,309.30 286.44,317.10 289.52,324.57 292.60,331.52 295.69,337.69 298.77,342.79 301.85,346.57 304.93,348.83 308.01,349.61 311.09,349.50 314.17,349.14 317.25,349.11 320.33,349.93 323.41,351.59 326.49,353.57 329.57,355.32 332.66,356.30 335.74,356.13 338.82,355.11 341.90,353.93 344.98,353.25 348.06,353.68 351.14,355.63 354.22,358.76 357.30,362.56 360.38,366.52 363.46,370.16 366.54,373.27 369.62,376.08 372.71,378.86 375.79,381.90 378.87,385.46 381.95,389.51 385.03,393.78 388.11,397.96 391.19,401.80 394.27,405.08 397.35,407.87 400.43,410.42 403.51,412.98 406.59,415.76 409.68,418.94 412.76,422.43 415.84,426.11 418.92,429.85 422.00,433.54 425.08,437.00 428.16,439.92 431.24,442.04 434.32,443.09 437.40,442.85 440.48,441.29 443.56,438.59 446.64,434.92 449.73,430.46 452.81,425.37 455.89,419.86 458.97,414.15 462.05,408.41 465.13,402.83 468.21,397.52 471.29,392.54 474.37,387.89 477.45,383.56 480.53,379.55 483.61,375.93 486.70,372.90 489.78,370.66 492.86,369.40 495.94,369.28 499.02,370.29 502.10,372.27 505.18,375.06 508.26,378.51 511.34,382.45 514.42,386.68 517.50,390.98 520.58,395.16 523.66,399.03 526.75,402.48 529.83,405.51 532.91,408.19 535.99,410.58 539.07,412.74 542.15,414.73 545.23,416.63 548.31,418.52 551.39,420.46 554.47,422.51 557.55,424.67 560.63,426.88 563.72,429.11 566.80,431.28 569.88,433.37 572.96,435.44 576.04,437.57 579.12,439.85 582.20,442.36 585.28,445.18 588.36,448.27 591.44,451.63 594.52,455.23 597.60,459.03 600.68,462.95 603.77,466.81 606.85,470.42 609.93,473.61 613.01,476.24 616.09,478.14 619.17,479.17 622.25,479.20 625.33,478.11 628.41,475.84 631.49,472.55 634.57,468.55 637.65,464.10 640.74,459.46 643.82,454.85 646.90,450.37 649.98,446.11 653.06,442.14 656.14,438.48 659.22,435.18 662.30,432.19 665.38,429.47 668.46,427.00 671.54,424.73 674.62,422.62 677.70,420.62 680.79,418.68 683.87,416.77 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,146.46 73.87,146.62 76.95,146.85 80.03,146.94 83.11,146.71 86.19,145.97 89.27,144.86 92.35,143.82 95.43,143.29 98.51,143.67 101.59,145.28 104.68,147.95 107.76,151.24 110.84,154.69 113.92,157.90 117.00,160.52 120.08,162.40 123.16,163.44 126.24,163.57 129.32,162.76 132.40,161.04 135.48,158.59 138.56,155.63 141.65,152.33 144.73,148.88 147.81,145.46 150.89,142.27 153.97,139.49 157.05,137.28 160.13,135.76 163.21,135.00 166.29,135.02 169.37,135.84 172.45,137.46 175.53,139.90 178.61,143.24 181.70,147.56 184.78,152.96 187.86,159.51 190.94,167.01 194.02,174.72 197.10,181.87 200.18,187.75 203.26,191.75 206.34,193.98 209.42,195.32 212.50,196.66 215.58,198.82 218.67,202.50 221.75,207.60 224.83,213.61 227.91,219.99 230.99,226.24 234.07,231.99 237.15,237.23 240.23,242.12 243.31,246.80 246.39,251.41 249.47,256.02 252.55,260.59 255.63,265.02 258.72,269.25 261.80,273.21 264.88,276.93 267.96,280.55 271.04,284.19 274.12,287.98 277.20,292.00 280.28,296.22 283.36,300.52 286.44,304.76 289.52,308.84 292.60,312.70 295.69,316.42 298.77,320.14 301.85,324.00 304.93,328.11 308.01,332.53 311.09,337.21 314.17,342.06 317.25,347.01 320.33,351.97 323.41,356.77 326.49,361.14 329.57,364.80 332.66,367.53 335.74,369.14 338.82,369.81 341.90,369.88 344.98,369.68 348.06,369.54 351.14,369.67 354.22,370.03 357.30,370.48 360.38,370.91 363.46,371.18 366.54,371.33 369.62,371.76 372.71,372.87 375.79,375.02 378.87,378.55 381.95,383.29 385.03,388.62 388.11,393.93 391.19,398.62 394.27,402.24 397.35,404.94 400.43,407.17 403.51,409.41 406.59,412.10 409.68,415.52 412.76,419.53 415.84,423.86 418.92,428.23 422.00,432.39 425.08,436.15 428.16,439.41 431.24,442.09 434.32,444.13 437.40,445.49 440.48,446.07 443.56,445.72 446.64,444.31 449.73,441.73 452.81,437.89 455.89,433.03 458.97,427.51 462.05,421.65 465.13,415.80 468.21,410.22 471.29,405.14 474.37,400.77 477.45,397.27 480.53,394.77 483.61,393.29 486.70,392.59 489.78,392.43 492.86,392.58 495.94,392.83 499.02,393.07 502.10,393.34 505.18,393.68 508.26,394.12 511.34,394.71 514.42,395.46 517.50,396.39 520.58,397.49 523.66,398.79 526.75,400.26 529.83,401.81 532.91,403.34 535.99,404.75 539.07,405.96 542.15,406.98 545.23,408.02 548.31,409.28 551.39,410.97 554.47,413.26 557.55,416.18 560.63,419.65 563.72,423.56 566.80,427.81 569.88,432.31 572.96,436.94 576.04,441.59 579.12,446.15 582.20,450.52 585.28,454.62 588.36,458.38 591.44,461.73 594.52,464.61 597.60,466.98 600.68,468.77 603.77,469.85 606.85,470.14 609.93,469.52 613.01,467.92 616.09,465.43 619.17,462.26 622.25,458.65 625.33,454.78 628.41,450.84 631.49,446.86 634.57,442.84 637.65,438.73 640.74,434.51 643.82,430.19 646.90,425.88 649.98,421.74 653.06,417.91 656.14,414.52 659.22,411.65 662.30,409.30 665.38,407.50 668.46,406.22 671.54,405.45 674.62,405.08 677.70,404.87 680.79,404.61 683.87,404.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,101.29 73.87,101.32 76.95,101.52 80.03,102.08 83.11,103.15 86.19,104.87 89.27,107.28 92.35,110.29 95.43,113.80 98.51,117.74 101.59,122.01 104.68,126.56 107.76,131.33 110.84,136.29 113.92,141.41 117.00,146.61 120.08,151.61 123.16,156.08 126.24,159.72 129.32,162.25 132.40,163.55 135.48,163.73 138.56,162.93 141.65,161.32 144.73,159.02 147.81,156.26 150.89,153.35 153.97,150.54 157.05,148.08 160.13,146.20 163.21,145.07 166.29,144.85 169.37,145.65 172.45,147.59 175.53,150.70 178.61,154.77 181.70,159.51 184.78,164.66 187.86,169.99 190.94,175.31 194.02,180.55 197.10,185.69 200.18,190.69 203.26,195.53 206.34,200.13 209.42,204.33 212.50,207.99 215.58,210.98 218.67,213.20 221.75,214.80 224.83,216.05 227.91,217.22 230.99,218.54 234.07,220.17 237.15,222.04 240.23,223.98 243.31,225.84 246.39,227.48 249.47,228.94 252.55,230.69 255.63,233.19 258.72,236.91 261.80,242.21 264.88,249.09 267.96,257.12 271.04,265.88 274.12,274.94 277.20,283.94 280.28,292.69 283.36,301.10 286.44,309.10 289.52,316.64 292.60,323.67 295.69,330.04 298.77,335.62 301.85,340.26 304.93,343.86 308.01,346.44 311.09,348.31 314.17,349.80 317.25,351.22 320.33,352.85 323.41,354.67 326.49,356.40 329.57,357.74 332.66,358.43 335.74,358.25 338.82,357.48 341.90,356.64 344.98,356.24 348.06,356.75 351.14,358.47 354.22,361.17 357.30,364.51 360.38,368.13 363.46,371.70 366.54,375.03 369.62,378.15 372.71,381.15 375.79,384.12 378.87,387.14 381.95,390.32 385.03,393.78 388.11,397.64 391.19,402.00 394.27,406.92 397.35,412.24 400.43,417.70 403.51,423.05 406.59,428.05 409.68,432.49 412.76,436.16 415.84,438.89 418.92,440.51 422.00,440.89 425.08,440.02 428.16,438.10 431.24,435.35 434.32,432.00 437.40,428.24 440.48,424.31 443.56,420.51 446.64,417.07 449.73,414.23 452.81,412.16 455.89,410.79 458.97,409.89 462.05,409.27 465.13,408.74 468.21,408.15 471.29,407.54 474.37,406.97 477.45,406.53 480.53,406.28 483.61,406.24 486.70,406.26 489.78,406.19 492.86,405.91 495.94,405.30 499.02,404.39 502.10,403.39 505.18,402.48 508.26,401.86 511.34,401.66 514.42,401.86 517.50,402.34 520.58,402.96 523.66,403.62 526.75,404.26 529.83,405.01 532.91,406.06 535.99,407.58 539.07,409.75 542.15,412.52 545.23,415.61 548.31,418.67 551.39,421.39 554.47,423.49 557.55,424.99 560.63,426.15 563.72,427.26 566.80,428.59 569.88,430.33 572.96,432.38 576.04,434.48 579.12,436.37 582.20,437.80 585.28,438.60 588.36,438.82 591.44,438.55 594.52,437.88 597.60,436.89 600.68,435.71 603.77,434.45 606.85,433.24 609.93,432.17 613.01,431.36 616.09,430.80 619.17,430.44 622.25,430.19 625.33,430.01 628.41,429.84 631.49,429.75 634.57,429.87 637.65,430.31 640.74,431.18 643.82,432.48 646.90,433.82 649.98,434.77 653.06,434.89 656.14,433.81 659.22,431.43 662.30,428.04 665.38,424.02 668.46,419.71 671.54,415.42 674.62,411.33 677.70,407.48 680.79,403.86 683.87,400.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,165.27 73.87,164.65 76.95,163.20 80.03,161.05 83.11,158.31 86.19,155.13 89.27,151.77 92.35,148.66 95.43,146.21 98.51,144.77 101.59,144.64 104.68,145.71 107.76,147.66 110.84,150.15 113.92,152.89 117.00,155.58 120.08,157.98 123.16,159.84 126.24,160.97 129.32,161.18 132.40,160.37 135.48,158.56 138.56,155.80 141.65,152.13 144.73,147.62 147.81,142.64 150.89,137.94 153.97,134.20 157.05,132.08 160.13,132.06 163.21,133.98 166.29,137.26 169.37,141.34 172.45,145.70 175.53,149.92 178.61,153.82 181.70,157.35 184.78,160.46 187.86,163.14 190.94,165.44 194.02,167.53 197.10,169.58 200.18,171.77 203.26,174.25 206.34,177.20 209.42,180.84 212.50,185.35 215.58,190.91 218.67,197.63 221.75,205.14 224.83,212.88 227.91,220.27 230.99,226.82 234.07,232.19 237.15,236.54 240.23,240.19 243.31,243.48 246.39,246.70 249.47,250.06 252.55,253.60 255.63,257.31 258.72,261.17 261.80,265.18 264.88,269.36 267.96,273.81 271.04,278.61 274.12,283.85 277.20,289.58 280.28,295.78 283.36,302.38 286.44,309.29 289.52,316.46 292.60,323.77 295.69,330.97 298.77,337.77 301.85,343.89 304.93,349.10 308.01,353.31 311.09,356.70 314.17,359.46 317.25,361.82 320.33,363.95 323.41,365.98 326.49,367.96 329.57,369.94 332.66,371.94 335.74,373.98 338.82,375.88 341.90,377.42 344.98,378.35 348.06,378.48 351.14,377.69 354.22,376.29 357.30,374.63 360.38,373.08 363.46,371.98 366.54,371.53 369.62,371.81 372.71,372.83 375.79,374.59 378.87,377.08 381.95,380.15 385.03,383.55 388.11,387.02 391.19,390.32 394.27,393.26 397.35,395.92 400.43,398.52 403.51,401.27 406.59,404.36 409.68,407.94 412.76,412.02 415.84,416.53 418.92,421.44 422.00,426.68 425.08,432.03 428.16,436.97 431.24,440.96 434.32,443.50 437.40,444.16 440.48,443.00 443.56,440.47 446.64,437.07 449.73,433.28 452.81,429.50 455.89,425.85 458.97,422.31 462.05,418.84 465.13,415.38 468.21,411.90 471.29,408.39 474.37,404.89 477.45,401.40 480.53,397.96 483.61,394.56 486.70,391.22 489.78,387.94 492.86,384.73 495.94,381.59 499.02,378.72 502.10,376.43 505.18,375.06 508.26,374.90 511.34,376.15 514.42,378.59 517.50,381.78 520.58,385.28 523.66,388.72 526.75,391.80 529.83,394.57 532.91,397.17 535.99,399.73 539.07,402.40 542.15,405.25 545.23,408.25 548.31,411.37 551.39,414.56 554.47,417.77 557.55,420.88 560.63,423.67 563.72,425.93 566.80,427.47 569.88,428.17 572.96,428.24 576.04,428.04 579.12,427.89 582.20,428.14 585.28,428.97 588.36,430.24 591.44,431.75 594.52,433.28 597.60,434.61 600.68,435.69 603.77,436.70 606.85,437.84 609.93,439.31 613.01,441.28 616.09,443.77 619.17,446.66 622.25,449.83 625.33,453.17 628.41,456.55 631.49,459.90 634.57,463.15 637.65,466.23 640.74,469.10 643.82,471.71 646.90,474.10 649.98,476.28 653.06,478.29 656.14,480.16 659.22,481.89 662.30,483.42 665.38,484.70 668.46,485.68 671.54,486.31 674.62,486.55 677.70,486.38 680.79,485.77 683.87,484.72 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,98.54 73.87,98.74 76.95,99.30 80.03,100.30 83.11,101.84 86.19,103.96 89.27,106.67 92.35,109.90 95.43,113.58 98.51,117.64 101.59,122.01 104.68,126.45 107.76,130.67 110.84,134.38 113.92,137.33 117.00,139.35 120.08,140.49 123.16,140.88 126.24,140.66 129.32,139.96 132.40,138.87 135.48,137.47 138.56,135.82 141.65,133.97 144.73,131.96 147.81,129.97 150.89,128.32 153.97,127.31 157.05,127.21 160.13,128.26 163.21,130.45 166.29,133.70 169.37,137.88 172.45,142.91 175.53,148.63 178.61,154.79 181.70,161.11 184.78,167.33 187.86,173.23 190.94,178.71 194.02,183.94 197.10,189.11 200.18,194.40 203.26,199.99 206.34,205.76 209.42,211.33 212.50,216.32 215.58,220.36 218.67,223.20 221.75,225.07 224.83,226.50 227.91,228.00 230.99,230.03 234.07,232.92 237.15,236.52 240.23,240.54 243.31,244.68 246.39,248.68 249.47,252.38 252.55,255.83 255.63,259.12 258.72,262.34 261.80,265.58 264.88,268.91 267.96,272.40 271.04,276.09 274.12,280.03 277.20,284.25 280.28,288.73 283.36,293.41 286.44,298.23 289.52,303.14 292.60,308.12 295.69,313.31 298.77,318.84 301.85,324.87 304.93,331.52 308.01,338.71 311.09,345.90 314.17,352.57 317.25,358.18 320.33,362.30 323.41,364.94 326.49,366.55 329.57,367.61 332.66,368.57 335.74,369.82 338.82,371.33 341.90,372.91 344.98,374.32 348.06,375.36 351.14,375.90 354.22,376.19 357.30,376.53 360.38,377.22 363.46,378.55 366.54,380.57 369.62,382.95 372.71,385.31 375.79,387.31 378.87,388.63 381.95,389.34 385.03,389.83 388.11,390.55 391.19,391.88 394.27,394.16 397.35,397.42 400.43,401.52 403.51,406.34 406.59,411.72 409.68,417.47 412.76,423.16 415.84,428.34 418.92,432.57 422.00,435.47 425.08,436.89 428.16,437.06 431.24,436.26 434.32,434.75 437.40,432.79 440.48,430.57 443.56,428.21 446.64,425.82 449.73,423.47 452.81,421.23 455.89,419.12 458.97,417.13 462.05,415.27 465.13,413.50 468.21,411.84 471.29,410.26 474.37,408.79 477.45,407.42 480.53,406.16 483.61,404.96 486.70,403.69 489.78,402.22 492.86,400.44 495.94,398.22 499.02,395.67 502.10,393.03 505.18,390.55 508.26,388.48 511.34,386.99 514.42,386.08 517.50,385.65 520.58,385.56 523.66,385.72 526.75,386.06 529.83,386.71 532.91,387.85 535.99,389.63 539.07,392.19 542.15,395.59 545.23,399.67 548.31,404.27 551.39,409.24 554.47,414.45 557.55,419.69 560.63,424.77 563.72,429.48 566.80,433.64 569.88,437.13 572.96,440.01 576.04,442.42 579.12,444.53 582.20,446.47 585.28,448.34 588.36,450.13 591.44,451.76 594.52,453.18 597.60,454.32 600.68,455.15 603.77,455.70 606.85,455.97 609.93,456.00 613.01,455.80 616.09,455.36 619.17,454.65 622.25,453.65 625.33,452.31 628.41,450.65 631.49,448.78 634.57,446.91 637.65,445.22 640.74,443.89 643.82,443.02 646.90,442.55 649.98,442.40 653.06,442.45 656.14,442.62 659.22,442.75 662.30,442.64 665.38,442.06 668.46,440.83 671.54,438.77 674.62,435.94 677.70,432.58 680.79,428.91 683.87,425.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,118.72 73.87,119.25 76.95,120.35 80.03,121.72 83.11,123.08 86.19,124.18 89.27,124.98 92.35,125.70 95.43,126.54 98.51,127.73 101.59,129.42 104.68,131.48 107.76,133.61 110.84,135.51 113.92,136.91 117.00,137.64 120.08,137.82 123.16,137.67 126.24,137.39 129.32,137.17 132.40,137.11 135.48,137.06 138.56,136.84 141.65,136.30 144.73,135.28 147.81,133.81 150.89,132.14 153.97,130.47 157.05,129.03 160.13,128.03 163.21,127.78 166.29,128.63 169.37,130.91 172.45,134.90 175.53,140.71 178.61,147.84 181.70,155.61 184.78,163.41 187.86,170.66 190.94,176.99 194.02,182.37 197.10,186.83 200.18,190.43 203.26,193.25 206.34,195.48 209.42,197.46 212.50,199.51 215.58,201.91 218.67,204.90 221.75,208.53 224.83,212.76 227.91,217.50 230.99,222.69 234.07,228.21 237.15,233.71 240.23,238.81 243.31,243.17 246.39,246.47 249.47,248.69 252.55,250.32 255.63,251.92 258.72,254.02 261.80,257.08 264.88,261.28 267.96,266.45 271.04,272.43 274.12,279.04 277.20,286.12 280.28,293.53 283.36,301.20 286.44,309.03 289.52,316.98 292.60,324.94 295.69,332.64 298.77,339.81 301.85,346.19 304.93,351.53 308.01,355.75 311.09,358.99 314.17,361.45 317.25,363.28 320.33,364.67 323.41,365.63 326.49,366.02 329.57,365.73 332.66,364.63 335.74,362.63 338.82,359.99 341.90,357.13 344.98,354.44 348.06,352.28 351.14,350.97 354.22,350.70 357.30,351.63 360.38,353.87 363.46,357.52 366.54,362.54 369.62,368.61 372.71,375.39 375.79,382.57 378.87,389.87 381.95,397.05 385.03,403.91 388.11,410.29 391.19,416.04 394.27,421.05 397.35,425.29 400.43,428.77 403.51,431.50 406.59,433.51 409.68,434.89 412.76,435.92 415.84,436.96 418.92,438.32 422.00,440.29 425.08,442.92 428.16,445.87 431.24,448.72 434.32,451.11 437.40,452.68 440.48,453.20 443.56,452.51 446.64,450.49 449.73,447.05 452.81,442.12 455.89,435.88 458.97,428.61 462.05,420.58 465.13,412.03 468.21,403.25 471.29,394.65 474.37,386.66 477.45,379.67 480.53,374.03 483.61,369.88 486.70,367.11 489.78,365.54 492.86,365.00 495.94,365.30 499.02,366.31 502.10,367.87 505.18,369.86 508.26,372.18 511.34,374.72 514.42,377.49 517.50,380.50 520.58,383.80 523.66,387.41 526.75,391.34 529.83,395.52 532.91,399.84 535.99,404.22 539.07,408.58 542.15,412.86 545.23,417.03 548.31,421.08 551.39,425.00 554.47,428.78 557.55,432.36 560.63,435.64 563.72,438.51 566.80,440.89 569.88,442.71 572.96,444.03 576.04,445.00 579.12,445.73 582.20,446.34 585.28,446.95 588.36,447.69 591.44,448.71 594.52,450.11 597.60,451.99 600.68,454.31 603.77,456.72 606.85,458.88 609.93,460.47 613.01,461.19 616.09,460.99 619.17,460.04 622.25,458.50 625.33,456.53 628.41,454.29 631.49,451.90 634.57,449.45 637.65,447.04 640.74,444.72 643.82,442.53 646.90,440.36 649.98,438.06 653.06,435.50 656.14,432.56 659.22,429.26 662.30,425.83 665.38,422.55 668.46,419.67 671.54,417.39 674.62,415.80 677.70,414.86 680.79,414.52 683.87,414.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,97.34 73.87,97.17 76.95,97.00 80.03,97.12 83.11,97.82 86.19,99.35 89.27,101.89 92.35,105.49 95.43,110.21 98.51,116.06 101.59,123.04 104.68,130.66 107.76,138.20 110.84,144.99 113.92,150.41 117.00,154.01 120.08,155.88 123.16,156.26 126.24,155.40 129.32,153.54 132.40,150.91 135.48,147.70 138.56,144.08 141.65,140.20 144.73,136.19 147.81,132.36 150.89,129.18 153.97,127.10 157.05,126.53 160.13,127.77 163.21,130.66 166.29,134.75 169.37,139.63 172.45,144.90 175.53,150.23 178.61,155.56 181.70,160.91 184.78,166.32 187.86,171.82 190.94,177.35 194.02,182.61 197.10,187.30 200.18,191.13 203.26,193.87 206.34,195.63 209.42,196.90 212.50,198.19 215.58,199.94 218.67,202.54 221.75,206.01 224.83,210.15 227.91,214.77 230.99,219.67 234.07,224.67 237.15,229.64 240.23,234.43 243.31,238.95 246.39,243.09 249.47,246.90 252.55,250.64 255.63,254.59 258.72,259.04 261.80,264.20 264.88,270.10 267.96,276.56 271.04,283.36 274.12,290.30 277.20,297.20 280.28,303.92 283.36,310.33 286.44,316.30 289.52,321.76 292.60,326.64 295.69,331.03 298.77,335.05 301.85,338.83 304.93,342.46 308.01,346.00 311.09,349.35 314.17,352.41 317.25,355.10 320.33,357.31 323.41,359.07 326.49,360.46 329.57,361.58 332.66,362.54 335.74,363.40 338.82,364.21 341.90,365.00 344.98,365.75 348.06,366.50 351.14,367.25 354.22,368.08 357.30,369.08 360.38,370.35 363.46,371.94 366.54,373.88 369.62,376.06 372.71,378.36 375.79,380.68 378.87,382.92 381.95,385.00 385.03,386.86 388.11,388.48 391.19,389.80 394.27,390.83 397.35,391.70 400.43,392.63 403.51,393.82 406.59,395.47 409.68,397.70 412.76,400.50 415.84,403.79 418.92,407.51 422.00,411.59 425.08,415.90 428.16,420.24 431.24,424.38 434.32,428.14 437.40,431.35 440.48,433.94 443.56,435.94 446.64,437.38 449.73,438.32 452.81,438.78 455.89,438.75 458.97,438.19 462.05,437.05 465.13,435.30 468.21,432.90 471.29,429.88 474.37,426.24 477.45,422.02 480.53,417.23 483.61,412.07 486.70,407.01 489.78,402.56 492.86,399.18 495.94,397.26 499.02,396.83 502.10,397.58 505.18,399.20 508.26,401.38 511.34,403.83 514.42,406.35 517.50,408.78 520.58,411.00 523.66,412.90 526.75,414.43 529.83,415.72 532.91,416.95 535.99,418.30 539.07,419.90 542.15,421.80 545.23,423.80 548.31,425.69 551.39,427.28 554.47,428.37 557.55,428.96 560.63,429.14 563.72,429.02 566.80,428.73 569.88,428.36 572.96,428.01 576.04,427.79 579.12,427.78 582.20,428.05 585.28,428.62 588.36,429.34 591.44,430.04 594.52,430.55 597.60,430.72 600.68,430.46 603.77,429.87 606.85,429.02 609.93,428.01 613.01,426.92 616.09,425.81 619.17,424.67 622.25,423.54 625.33,422.40 628.41,421.29 631.49,420.33 634.57,419.73 637.65,419.65 640.74,420.27 643.82,421.69 646.90,423.96 649.98,427.07 653.06,431.03 656.14,435.82 659.22,441.31 662.30,447.18 665.38,453.09 668.46,458.74 671.54,463.87 674.62,468.39 677.70,472.36 680.79,475.89 683.87,479.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,72.26 73.87,72.37 76.95,72.74 80.03,73.55 83.11,74.94 86.19,77.01 89.27,79.83 92.35,83.35 95.43,87.55 98.51,92.38 101.59,97.78 104.68,103.61 107.76,109.62 110.84,115.62 113.92,121.43 117.00,126.91 120.08,132.11 123.16,137.13 126.24,142.08 129.32,147.04 132.40,151.99 135.48,156.60 138.56,160.53 141.65,163.47 144.73,165.13 147.81,165.50 150.89,164.82 153.97,163.35 157.05,161.34 160.13,159.03 163.21,156.74 166.29,154.81 169.37,153.54 172.45,153.21 175.53,153.98 178.61,155.64 181.70,157.89 184.78,160.42 187.86,162.97 190.94,165.34 194.02,167.48 197.10,169.40 200.18,171.09 203.26,172.56 206.34,174.08 209.42,176.17 212.50,179.32 215.58,183.98 218.67,190.49 221.75,198.51 224.83,207.35 227.91,216.34 230.99,224.85 234.07,232.40 237.15,238.88 240.23,244.31 243.31,248.74 246.39,252.23 249.47,254.89 252.55,256.94 255.63,258.61 258.72,260.09 261.80,261.58 264.88,263.30 267.96,265.55 271.04,268.59 274.12,272.65 277.20,277.91 280.28,284.26 283.36,291.44 286.44,299.18 289.52,307.26 292.60,315.42 295.69,323.31 298.77,330.57 301.85,336.89 304.93,341.98 308.01,345.77 311.09,348.56 314.17,350.68 317.25,352.47 320.33,354.21 323.41,356.07 326.49,358.06 329.57,360.19 332.66,362.42 335.74,364.76 338.82,367.16 341.90,369.57 344.98,371.95 348.06,374.26 351.14,376.47 354.22,378.54 357.30,380.44 360.38,382.13 363.46,383.59 366.54,384.84 369.62,385.99 372.71,387.16 375.79,388.45 378.87,389.95 381.95,391.68 385.03,393.58 388.11,395.59 391.19,397.63 394.27,399.68 397.35,401.75 400.43,403.94 403.51,406.33 406.59,409.00 409.68,411.95 412.76,415.01 415.84,417.93 418.92,420.48 422.00,422.47 425.08,423.79 428.16,424.50 431.24,424.69 434.32,424.45 437.40,423.87 440.48,423.02 443.56,421.99 446.64,420.84 449.73,419.63 452.81,418.43 455.89,417.41 458.97,416.79 462.05,416.78 465.13,417.56 468.21,419.19 471.29,421.29 474.37,423.39 477.45,425.07 480.53,425.90 483.61,425.71 486.70,424.61 489.78,422.78 492.86,420.41 495.94,417.68 499.02,414.86 502.10,412.30 505.18,410.34 508.26,409.26 511.34,409.27 514.42,410.08 517.50,411.20 520.58,412.13 523.66,412.40 526.75,411.75 529.83,410.48 532.91,409.02 535.99,407.80 539.07,407.22 542.15,407.45 545.23,408.29 548.31,409.52 551.39,410.91 554.47,412.23 557.55,413.43 560.63,414.62 563.72,415.88 566.80,417.30 569.88,418.99 572.96,420.91 576.04,423.02 579.12,425.27 582.20,427.59 585.28,429.96 588.36,432.40 591.44,434.96 594.52,437.67 597.60,440.56 600.68,443.61 603.77,446.69 606.85,449.64 609.93,452.35 613.01,454.68 616.09,456.52 619.17,457.77 622.25,458.32 625.33,458.10 628.41,457.05 631.49,455.21 634.57,452.68 637.65,449.58 640.74,445.98 643.82,442.01 646.90,437.89 649.98,433.83 653.06,430.05 656.14,426.72 659.22,423.93 662.30,421.60 665.38,419.61 668.46,417.86 671.54,416.27 674.62,414.85 677.70,413.70 680.79,412.96 683.87,412.72 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,141.67 73.87,142.57 76.95,144.40 80.03,146.67 83.11,148.92 86.19,150.69 89.27,151.90 92.35,152.84 95.43,153.83 98.51,155.18 101.59,157.11 104.68,159.40 107.76,161.57 110.84,163.15 113.92,163.70 117.00,162.97 120.08,161.35 123.16,159.39 126.24,157.63 129.32,156.55 132.40,156.39 135.48,156.90 138.56,157.72 141.65,158.55 144.73,159.06 147.81,159.16 150.89,158.90 153.97,158.38 157.05,157.70 160.13,156.95 163.21,156.19 166.29,155.47 169.37,154.84 172.45,154.34 175.53,153.99 178.61,153.81 181.70,153.84 184.78,154.07 187.86,154.53 190.94,155.31 194.02,156.72 197.10,159.07 200.18,162.61 203.26,167.61 206.34,174.01 209.42,181.50 212.50,189.76 215.58,198.47 218.67,207.33 221.75,215.94 224.83,223.83 227.91,230.58 230.99,235.83 234.07,239.40 237.15,241.80 240.23,243.70 243.31,245.77 246.39,248.58 249.47,252.45 252.55,257.12 255.63,262.30 258.72,267.65 261.80,272.90 264.88,277.86 267.96,282.47 271.04,286.71 274.12,290.54 277.20,293.97 280.28,297.22 283.36,300.60 286.44,304.40 289.52,308.89 292.60,314.21 295.69,320.09 298.77,326.12 301.85,331.93 304.93,337.17 308.01,341.64 311.09,345.42 314.17,348.63 317.25,351.40 320.33,353.84 323.41,355.98 326.49,357.76 329.57,359.12 332.66,359.99 335.74,360.33 338.82,360.11 341.90,359.32 344.98,357.98 348.06,356.08 351.14,353.74 354.22,351.51 357.30,350.02 360.38,349.88 363.46,351.61 366.54,355.35 369.62,360.50 372.71,366.40 375.79,372.40 378.87,377.95 381.95,382.97 385.03,387.90 388.11,393.20 391.19,399.29 394.27,406.52 397.35,414.49 400.43,422.48 403.51,429.80 406.59,435.80 409.68,440.07 412.76,442.96 415.84,445.01 418.92,446.76 422.00,448.71 425.08,451.04 428.16,453.37 431.24,455.27 434.32,456.31 437.40,456.12 440.48,454.56 443.56,451.72 446.64,447.74 449.73,442.73 452.81,436.85 455.89,430.32 458.97,423.42 462.05,416.41 465.13,409.52 468.21,402.96 471.29,396.94 474.37,391.68 477.45,387.34 480.53,384.08 483.61,381.94 486.70,380.82 489.78,380.60 492.86,381.15 495.94,382.35 499.02,383.98 502.10,385.75 505.18,387.37 508.26,388.59 511.34,389.22 514.42,389.43 517.50,389.57 520.58,389.96 523.66,390.90 526.75,392.61 529.83,394.99 532.91,397.86 535.99,401.05 539.07,404.39 542.15,407.77 545.23,411.12 548.31,414.40 551.39,417.58 554.47,420.63 557.55,423.52 560.63,426.24 563.72,428.74 566.80,431.02 569.88,433.06 572.96,434.84 576.04,436.34 579.12,437.54 582.20,438.43 585.28,439.05 588.36,439.62 591.44,440.36 594.52,441.50 597.60,443.24 600.68,445.60 603.77,448.28 606.85,450.94 609.93,453.29 613.01,455.05 616.09,456.15 619.17,456.70 622.25,456.81 625.33,456.63 628.41,456.24 631.49,455.71 634.57,455.03 637.65,454.21 640.74,453.25 643.82,452.16 646.90,450.95 649.98,449.64 653.06,448.25 656.14,446.80 659.22,445.29 662.30,443.74 665.38,442.17 668.46,440.57 671.54,438.96 674.62,437.39 677.70,435.97 680.79,434.79 683.87,433.93 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,120.30 73.87,120.75 76.95,121.85 80.03,123.62 83.11,126.03 86.19,129.06 89.27,132.50 92.35,135.98 95.43,139.11 98.51,141.57 101.59,143.08 104.68,143.62 107.76,143.36 110.84,142.45 113.92,141.04 117.00,139.28 120.08,137.38 123.16,135.49 126.24,133.78 129.32,132.40 132.40,131.45 135.48,131.03 138.56,131.21 141.65,132.06 144.73,133.63 147.81,135.79 150.89,138.31 153.97,140.91 157.05,143.35 160.13,145.46 163.21,147.30 166.29,149.06 169.37,150.94 172.45,153.15 175.53,155.80 178.61,158.81 181.70,162.00 184.78,165.23 187.86,168.36 190.94,171.33 194.02,174.24 197.10,177.23 200.18,180.40 203.26,183.88 206.34,187.72 209.42,191.91 212.50,196.44 215.58,201.30 218.67,206.45 221.75,211.71 224.83,216.84 227.91,221.58 230.99,225.73 234.07,229.16 237.15,232.09 240.23,234.79 243.31,237.56 246.39,240.64 249.47,244.15 252.55,247.95 255.63,251.86 258.72,255.71 261.80,259.34 264.88,262.90 267.96,266.81 271.04,271.51 274.12,277.39 277.20,284.74 280.28,293.10 283.36,301.67 286.44,309.66 289.52,316.35 292.60,321.25 295.69,324.74 298.77,327.38 301.85,329.75 304.93,332.37 308.01,335.53 311.09,339.09 314.17,342.84 317.25,346.54 320.33,350.02 323.41,353.16 326.49,355.99 329.57,358.55 332.66,360.85 335.74,362.97 338.82,365.04 341.90,367.28 344.98,369.89 348.06,373.03 351.14,376.78 354.22,380.82 357.30,384.72 360.38,388.12 363.46,390.65 366.54,392.17 369.62,392.97 372.71,393.37 375.79,393.68 378.87,394.18 381.95,394.91 385.03,395.69 388.11,396.33 391.19,396.65 394.27,396.51 397.35,396.12 400.43,395.85 403.51,396.09 406.59,397.16 409.68,399.27 412.76,402.16 415.84,405.47 418.92,408.86 422.00,412.00 425.08,414.67 428.16,416.83 431.24,418.49 434.32,419.65 437.40,420.33 440.48,420.59 443.56,420.55 446.64,420.30 449.73,419.95 452.81,419.56 455.89,419.03 458.97,418.15 462.05,416.75 465.13,414.66 468.21,411.78 471.29,408.33 474.37,404.57 477.45,400.76 480.53,397.14 483.61,393.92 486.70,391.27 489.78,389.34 492.86,388.26 495.94,388.14 499.02,388.94 502.10,390.54 505.18,392.79 508.26,395.56 511.34,398.70 514.42,401.99 517.50,405.15 520.58,407.95 523.66,410.15 526.75,411.65 529.83,412.63 532.91,413.37 535.99,414.11 539.07,415.11 542.15,416.44 545.23,417.94 548.31,419.42 551.39,420.69 554.47,421.58 557.55,422.18 560.63,422.81 563.72,423.76 566.80,425.33 569.88,427.74 572.96,430.89 576.04,434.55 579.12,438.45 582.20,442.36 585.28,446.10 588.36,449.57 591.44,452.69 594.52,455.41 597.60,457.69 600.68,459.49 603.77,460.71 606.85,461.30 609.93,461.18 613.01,460.30 616.09,458.73 619.17,456.60 622.25,454.07 625.33,451.28 628.41,448.35 631.49,445.36 634.57,442.38 637.65,439.44 640.74,436.58 643.82,433.88 646.90,431.46 649.98,429.50 653.06,428.14 656.14,427.50 659.22,427.67 662.30,428.66 665.38,430.47 668.46,433.09 671.54,436.52 674.62,440.61 677.70,445.16 680.79,449.93 683.87,454.75 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> -<polyline points='70.79,169.37 73.87,169.24 76.95,168.72 80.03,167.60 83.11,165.65 86.19,162.72 89.27,158.99 92.35,155.05 95.43,151.48 98.51,148.81 101.59,147.48 104.68,147.30 107.76,147.75 110.84,148.32 113.92,148.53 117.00,148.03 120.08,147.06 123.16,145.96 126.24,145.12 129.32,144.86 132.40,145.30 135.48,146.14 138.56,147.00 141.65,147.54 144.73,147.46 147.81,146.73 150.89,145.66 153.97,144.55 157.05,143.69 160.13,143.34 163.21,143.60 166.29,144.49 169.37,146.01 172.45,148.13 175.53,150.87 178.61,154.22 181.70,158.20 184.78,162.82 187.86,168.09 190.94,173.88 194.02,179.74 197.10,185.23 200.18,189.93 203.26,193.48 206.34,195.88 209.42,197.50 212.50,198.72 215.58,199.92 218.67,201.41 221.75,203.32 224.83,205.68 227.91,208.49 230.99,211.76 234.07,215.47 237.15,219.72 240.23,224.60 243.31,230.20 246.39,236.60 249.47,243.74 252.55,251.35 255.63,259.14 258.72,266.82 261.80,274.16 264.88,281.02 267.96,287.43 271.04,293.42 274.12,299.02 277.20,304.26 280.28,309.19 283.36,313.82 286.44,318.18 289.52,322.30 292.60,326.18 295.69,329.80 298.77,333.16 301.85,336.23 304.93,338.99 308.01,341.46 311.09,343.74 314.17,345.92 317.25,348.10 320.33,350.36 323.41,352.65 326.49,354.83 329.57,356.77 332.66,358.31 335.74,359.37 338.82,360.05 341.90,360.58 344.98,361.17 348.06,362.03 351.14,363.33 354.22,365.14 357.30,367.53 360.38,370.54 363.46,374.21 366.54,378.47 369.62,383.13 372.71,387.96 375.79,392.76 378.87,397.34 381.95,401.54 385.03,405.21 388.11,408.22 391.19,410.45 394.27,411.85 397.35,412.65 400.43,413.21 403.51,413.89 406.59,415.02 409.68,416.81 412.76,419.16 415.84,421.85 418.92,424.69 422.00,427.48 425.08,429.99 428.16,431.96 431.24,433.10 434.32,433.17 437.40,431.98 440.48,429.56 443.56,426.21 446.64,422.20 449.73,417.82 452.81,413.31 455.89,408.73 458.97,404.08 462.05,399.33 465.13,394.45 468.21,389.48 471.29,384.73 474.37,380.56 477.45,377.29 480.53,375.22 483.61,374.46 486.70,374.76 489.78,375.84 492.86,377.42 495.94,379.26 499.02,381.14 502.10,382.89 505.18,384.36 508.26,385.44 511.34,386.06 514.42,386.60 517.50,387.63 520.58,389.70 523.66,393.31 526.75,398.72 529.83,405.55 532.91,413.25 535.99,421.27 539.07,429.14 542.15,436.44 545.23,442.96 548.31,448.52 551.39,452.97 554.47,456.20 557.55,458.26 560.63,459.39 563.72,459.81 566.80,459.73 569.88,459.34 572.96,458.74 576.04,458.00 579.12,457.16 582.20,456.26 585.28,455.33 588.36,454.37 591.44,453.38 594.52,452.38 597.60,451.35 600.68,450.35 603.77,449.48 606.85,448.87 609.93,448.63 613.01,448.86 616.09,449.51 619.17,450.43 622.25,451.47 625.33,452.48 628.41,453.33 631.49,453.84 634.57,453.83 637.65,453.15 640.74,451.65 643.82,449.29 646.90,446.30 649.98,442.96 653.06,439.54 656.14,436.29 659.22,433.37 662.30,430.80 665.38,428.55 668.46,426.60 671.54,424.94 674.62,423.51 677.70,422.28 680.79,421.22 683.87,420.27 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='40.13,510.88 714.52,510.88 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='40.13,397.26 714.52,397.26 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='40.13,283.63 714.52,283.63 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='40.13,170.01 714.52,170.01 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='40.13,56.38 714.52,56.38 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='50.00,545.11 50.00,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='195.48,545.11 195.48,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='340.96,545.11 340.96,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='502.02,545.11 502.02,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='663.08,545.11 663.08,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='40.13,432.12 714.52,432.12 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='40.13,362.39 714.52,362.39 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='40.13,204.87 714.52,204.87 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='40.13,135.14 714.52,135.14 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='122.74,545.11 122.74,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='268.22,545.11 268.22,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='413.70,545.11 413.70,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='590.35,545.11 590.35,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<line x1='40.13' y1='362.39' x2='714.52' y2='362.39' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.50; stroke-linecap: butt;' /> +<polyline points='70.79,127.09 81.18,128.12 91.57,131.44 101.96,137.50 112.35,145.70 122.74,154.13 133.13,161.07 143.53,165.87 153.92,168.52 164.31,169.28 174.70,169.22 185.09,169.52 195.48,171.89 205.87,178.99 216.26,192.97 226.65,212.43 237.05,233.64 247.44,253.66 257.83,271.96 268.22,288.86 278.61,304.82 289.00,320.51 299.39,336.46 309.78,351.44 320.18,362.82 330.57,368.67 340.96,370.71 351.35,371.95 361.74,374.49 372.13,378.35 382.52,383.21 392.91,388.47 403.30,393.33 413.70,397.06 424.09,399.56 434.48,400.96 444.87,401.50 455.26,401.62 465.65,401.79 476.04,402.61 486.43,404.87 496.83,409.12 507.22,414.27 517.61,418.39 528.00,420.20 538.39,420.47 548.78,420.38 559.17,420.66 569.56,421.37 579.95,422.45 590.35,423.04 600.74,421.82 611.13,417.61 621.52,409.68 631.91,397.51 642.30,381.30 652.69,362.37 663.08,342.16 673.48,322.17 683.87,303.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,123.09 81.18,121.08 91.57,117.93 101.96,117.03 112.35,119.51 122.74,123.54 133.13,127.46 143.53,132.70 153.92,142.36 164.31,157.88 174.70,174.99 185.09,188.48 195.48,196.43 205.87,201.72 216.26,207.44 226.65,214.50 237.05,222.24 247.44,230.11 257.83,238.62 268.22,248.54 278.61,260.12 289.00,272.68 299.39,285.49 309.78,297.91 320.18,309.40 330.57,319.72 340.96,330.11 351.35,342.26 361.74,356.75 372.13,371.78 382.52,385.29 392.91,396.52 403.30,405.91 413.70,413.93 424.09,420.79 434.48,426.56 444.87,431.31 455.26,435.15 465.65,438.19 476.04,440.49 486.43,442.06 496.83,442.93 507.22,443.07 517.61,442.44 528.00,440.99 538.39,438.69 548.78,435.50 559.17,430.97 569.56,424.03 579.95,413.83 590.35,401.31 600.74,388.51 611.13,377.14 621.52,367.61 631.91,359.94 642.30,353.71 652.69,347.84 663.08,341.33 673.48,334.77 683.87,329.81 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,184.44 81.18,181.70 91.57,174.86 101.96,165.19 112.35,155.33 122.74,149.52 133.13,151.13 143.53,158.12 153.92,165.47 164.31,169.65 174.70,171.84 185.09,174.40 195.48,178.80 205.87,185.12 216.26,193.19 226.65,202.50 237.05,212.29 247.44,222.22 257.83,233.42 268.22,247.38 278.61,264.34 289.00,282.21 299.39,298.88 309.78,313.72 320.18,327.36 330.57,340.41 340.96,353.23 351.35,366.07 361.74,378.82 372.13,390.65 382.52,400.70 392.91,408.64 403.30,414.66 413.70,419.13 424.09,423.25 434.48,428.55 444.87,435.54 455.26,442.16 465.65,445.99 476.04,446.19 486.43,443.73 496.83,439.64 507.22,434.35 517.61,427.92 528.00,420.71 538.39,414.10 548.78,409.55 559.17,407.31 569.56,405.89 579.95,403.80 590.35,400.57 600.74,396.37 611.13,391.32 621.52,385.09 631.91,377.31 642.30,368.06 652.69,358.23 663.08,348.70 673.48,340.14 683.87,333.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,103.72 81.18,103.17 91.57,105.02 101.96,113.62 112.35,129.38 122.74,147.85 133.13,164.89 143.53,178.73 153.92,189.14 164.31,196.37 174.70,202.01 185.09,207.85 195.48,215.00 205.87,223.67 216.26,233.80 226.65,244.40 237.05,253.86 247.44,261.26 257.83,268.59 268.22,278.59 278.61,292.67 289.00,309.90 299.39,329.07 309.78,348.45 320.18,365.93 330.57,379.82 340.96,389.90 351.35,396.57 361.74,400.25 372.13,401.47 382.52,400.75 392.91,398.27 403.30,393.91 413.70,387.76 424.09,381.77 434.48,378.64 444.87,379.85 455.26,383.98 465.65,389.11 476.04,394.63 486.43,401.38 496.83,410.19 507.22,420.46 517.61,430.91 528.00,440.26 538.39,447.00 548.78,449.73 559.17,448.30 569.56,444.19 579.95,438.94 590.35,433.24 600.74,427.26 611.13,420.83 621.52,412.83 631.91,401.92 642.30,387.78 652.69,371.66 663.08,354.94 673.48,338.45 683.87,322.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,259.90 81.18,261.86 91.57,263.58 101.96,259.91 112.35,248.91 122.74,232.92 133.13,214.72 143.53,197.59 153.92,184.84 164.31,178.64 174.70,178.11 185.09,181.52 195.48,187.74 205.87,196.66 216.26,208.24 226.65,221.09 237.05,232.93 247.44,242.34 257.83,250.92 268.22,261.09 278.61,274.39 289.00,290.73 299.39,309.69 309.78,329.41 320.18,346.93 330.57,359.91 340.96,369.11 351.35,376.33 361.74,383.04 372.13,389.90 382.52,397.36 392.91,405.23 403.30,412.73 413.70,419.07 424.09,423.65 434.48,425.98 444.87,425.87 455.26,423.96 465.65,421.01 476.04,417.65 486.43,414.33 496.83,411.44 507.22,408.96 517.61,406.68 528.00,404.58 538.39,403.35 548.78,403.78 559.17,405.43 569.56,406.23 579.95,404.25 590.35,399.64 600.74,393.83 611.13,387.93 621.52,381.89 631.91,375.33 642.30,368.29 652.69,361.47 663.08,355.58 673.48,350.90 683.87,347.39 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,114.80 81.18,115.74 91.57,119.27 101.96,126.45 112.35,137.58 122.74,152.08 133.13,169.17 143.53,186.20 153.92,199.59 164.31,206.94 174.70,209.33 185.09,208.66 195.48,207.00 205.87,206.64 216.26,209.51 226.65,215.94 237.05,225.15 247.44,236.34 257.83,248.98 268.22,262.66 278.61,277.09 289.00,292.06 299.39,307.44 309.78,322.57 320.18,336.49 330.57,348.43 340.96,358.82 351.35,368.47 361.74,377.57 372.13,384.94 382.52,389.29 392.91,391.31 403.30,393.59 413.70,398.39 424.09,405.59 434.48,414.02 444.87,422.37 455.26,429.05 465.65,432.55 476.04,432.79 486.43,431.34 496.83,429.67 507.22,427.63 517.61,424.29 528.00,419.09 538.39,412.84 548.78,406.61 559.17,401.21 569.56,397.06 579.95,394.44 590.35,392.76 600.74,390.97 611.13,388.32 621.52,385.36 631.91,382.93 642.30,381.10 652.69,378.69 663.08,374.59 673.48,369.68 683.87,366.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,99.26 81.18,100.39 91.57,103.66 101.96,109.14 112.35,116.03 122.74,122.54 133.13,127.23 143.53,130.71 153.92,134.73 164.31,140.74 174.70,149.33 185.09,160.78 195.48,174.25 205.87,187.21 216.26,197.44 226.65,205.53 237.05,213.95 247.44,224.89 257.83,239.74 268.22,259.51 278.61,283.88 289.00,310.33 299.39,336.25 309.78,359.65 320.18,379.03 330.57,393.02 340.96,400.38 351.35,399.95 361.74,392.58 372.13,383.52 382.52,378.32 392.91,378.35 403.30,380.85 413.70,383.25 424.09,385.88 434.48,390.33 444.87,397.57 455.26,406.83 465.65,417.04 476.04,427.25 486.43,436.61 496.83,444.37 507.22,449.81 517.61,452.31 528.00,451.43 538.39,447.28 548.78,440.10 559.17,430.86 569.56,421.39 579.95,413.35 590.35,406.30 600.74,398.50 611.13,388.86 621.52,378.86 631.91,370.58 642.30,365.18 652.69,362.46 663.08,361.95 673.48,362.36 683.87,361.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,189.78 81.18,189.56 91.57,188.04 101.96,184.05 112.35,177.74 122.74,170.85 133.13,165.08 143.53,160.92 153.92,158.17 164.31,156.62 174.70,156.51 185.09,158.18 195.48,161.73 205.87,166.98 216.26,173.75 226.65,182.30 237.05,193.17 247.44,206.77 257.83,222.87 268.22,241.12 278.61,261.41 289.00,284.10 299.39,309.51 309.78,336.45 320.18,362.54 330.57,385.66 340.96,404.66 351.35,418.79 361.74,427.80 372.13,432.41 382.52,433.47 392.91,431.87 403.30,428.51 413.70,424.16 424.09,418.79 434.48,412.06 444.87,404.20 455.26,397.05 465.65,392.59 476.04,391.49 486.43,392.95 496.83,396.08 507.22,400.62 517.61,406.69 528.00,414.09 538.39,421.60 548.78,427.86 559.17,432.15 569.56,434.55 579.95,435.18 590.35,433.45 600.74,428.35 611.13,419.24 621.52,406.83 631.91,392.14 642.30,376.13 652.69,359.57 663.08,343.10 673.48,326.78 683.87,310.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,204.00 81.18,202.67 91.57,199.71 101.96,196.23 112.35,192.32 122.74,186.68 133.13,178.35 143.53,169.70 153.92,165.00 164.31,166.70 174.70,171.51 185.09,174.95 195.48,175.31 205.87,175.06 216.26,176.87 226.65,182.17 237.05,191.35 247.44,204.47 257.83,220.67 268.22,238.91 278.61,258.87 289.00,281.43 299.39,307.46 309.78,335.27 320.18,361.12 330.57,381.92 340.96,397.52 351.35,408.83 361.74,416.65 372.13,421.42 382.52,423.48 392.91,423.44 403.30,422.13 413.70,420.32 424.09,418.75 434.48,418.09 444.87,419.14 455.26,423.26 465.65,431.73 476.04,444.00 486.43,457.47 496.83,469.56 507.22,478.44 517.61,482.73 528.00,481.70 538.39,476.46 548.78,468.49 559.17,458.74 569.56,447.37 579.95,434.40 590.35,419.26 600.74,401.01 611.13,379.31 621.52,356.17 631.91,334.10 642.30,314.76 652.69,298.33 663.08,284.70 673.48,273.43 683.87,263.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,404.55 81.18,401.32 91.57,392.93 101.96,380.34 112.35,363.68 122.74,341.89 133.13,314.23 143.53,283.22 153.92,253.36 164.31,228.56 174.70,210.84 185.09,201.28 195.48,200.00 205.87,206.03 216.26,218.21 226.65,234.34 237.05,251.68 247.44,268.03 257.83,282.44 268.22,294.40 278.61,303.73 289.00,310.58 299.39,315.19 309.78,318.69 320.18,322.88 330.57,329.20 340.96,337.48 351.35,346.96 361.74,357.02 372.13,367.45 382.52,378.08 392.91,388.19 403.30,396.48 413.70,401.96 424.09,405.62 434.48,409.23 444.87,414.15 455.26,420.65 465.65,428.72 476.04,437.77 486.43,446.51 496.83,453.71 507.22,458.45 517.61,460.02 528.00,458.06 538.39,453.19 548.78,446.24 559.17,437.62 569.56,427.14 579.95,414.67 590.35,401.12 600.74,388.03 611.13,376.76 621.52,368.19 631.91,362.96 642.30,361.23 652.69,362.50 663.08,366.18 673.48,371.57 683.87,377.89 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,285.64 81.18,285.38 91.57,284.24 101.96,281.72 112.35,276.83 122.74,267.94 133.13,253.83 143.53,236.44 153.92,219.58 164.31,206.24 174.70,196.75 185.09,190.60 195.48,187.37 205.87,187.09 216.26,189.81 226.65,195.82 237.05,205.57 247.44,219.06 257.83,234.32 268.22,248.95 278.61,262.00 289.00,274.94 299.39,289.41 309.78,305.52 320.18,322.15 330.57,338.35 340.96,354.29 351.35,370.55 361.74,386.75 372.13,400.38 382.52,408.83 392.91,412.31 403.30,413.70 413.70,415.67 424.09,418.45 434.48,421.23 444.87,423.46 455.26,425.34 465.65,427.19 476.04,428.71 486.43,428.90 496.83,426.90 507.22,423.25 517.61,419.17 528.00,415.59 538.39,412.53 548.78,409.76 559.17,406.99 569.56,403.89 579.95,400.19 590.35,396.10 600.74,392.12 611.13,388.47 621.52,384.34 631.91,378.68 642.30,370.97 652.69,361.48 663.08,350.65 673.48,339.51 683.87,329.52 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,117.48 81.18,119.16 91.57,123.65 101.96,130.50 112.35,139.31 122.74,149.80 133.13,161.73 143.53,174.60 153.92,187.78 164.31,200.49 174.70,211.12 185.09,217.99 195.48,220.89 205.87,221.81 216.26,222.73 226.65,224.72 237.05,228.10 247.44,233.09 257.83,239.93 268.22,248.84 278.61,260.32 289.00,275.50 299.39,295.36 309.78,318.73 320.18,342.71 330.57,364.69 340.96,382.86 351.35,395.85 361.74,403.15 372.13,406.03 382.52,406.01 392.91,404.30 403.30,401.83 413.70,399.39 424.09,397.55 434.48,396.71 444.87,397.12 455.26,398.80 465.65,401.66 476.04,404.97 486.43,407.28 496.83,407.40 507.22,406.10 517.61,405.15 528.00,405.73 538.39,407.20 548.78,408.53 559.17,408.78 569.56,407.18 579.95,403.11 590.35,397.01 600.74,389.96 611.13,382.84 621.52,375.91 631.91,369.20 642.30,362.75 652.69,356.61 663.08,350.84 673.48,346.07 683.87,343.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,170.00 81.18,170.44 91.57,171.43 101.96,172.69 112.35,174.44 122.74,177.60 133.13,182.80 143.53,187.88 153.92,189.13 164.31,184.57 174.70,177.93 185.09,174.10 195.48,176.17 205.87,184.50 216.26,198.81 226.65,216.59 237.05,234.05 247.44,248.41 257.83,260.37 268.22,271.65 278.61,283.51 289.00,296.36 299.39,310.38 309.78,324.64 320.18,337.30 330.57,347.03 340.96,354.79 351.35,362.35 361.74,370.82 372.13,379.82 382.52,388.75 392.91,397.30 403.30,405.44 413.70,413.13 424.09,420.04 434.48,425.71 444.87,429.82 455.26,432.39 465.65,433.51 476.04,433.54 486.43,433.12 496.83,432.88 507.22,433.34 517.61,434.91 528.00,437.67 538.39,440.62 548.78,442.61 559.17,442.75 569.56,440.51 579.95,435.50 590.35,427.83 600.74,417.96 611.13,406.52 621.52,395.06 631.91,385.21 642.30,377.46 652.69,370.40 663.08,362.51 673.48,353.14 683.87,342.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,222.54 81.18,224.64 91.57,227.68 101.96,227.78 112.35,222.94 122.74,213.67 133.13,200.94 143.53,187.31 153.92,176.10 164.31,169.79 174.70,168.61 185.09,172.04 195.48,178.90 205.87,187.12 216.26,194.96 226.65,203.09 237.05,213.82 247.44,228.71 257.83,246.31 268.22,264.31 278.61,281.25 289.00,297.00 299.39,311.68 309.78,325.61 320.18,339.25 330.57,352.81 340.96,365.14 351.35,374.65 361.74,380.84 372.13,385.67 382.52,391.27 392.91,397.93 403.30,404.15 413.70,408.49 424.09,410.61 434.48,410.63 444.87,409.21 455.26,408.31 465.65,409.97 476.04,414.22 486.43,418.78 496.83,421.55 507.22,423.06 517.61,425.17 528.00,428.89 538.39,432.48 548.78,433.65 559.17,431.24 569.56,425.56 579.95,417.16 590.35,407.47 600.74,398.42 611.13,391.45 621.52,386.34 631.91,382.38 642.30,379.18 652.69,376.85 663.08,375.54 673.48,375.20 683.87,375.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,93.60 81.18,94.48 91.57,97.69 101.96,104.11 112.35,113.60 122.74,124.82 133.13,136.54 143.53,147.98 153.92,158.71 164.31,168.56 174.70,178.02 185.09,187.72 195.48,198.06 205.87,209.10 216.26,220.77 226.65,231.95 237.05,240.85 247.44,246.38 257.83,250.38 268.22,255.41 278.61,263.15 289.00,273.73 299.39,286.98 309.78,302.11 320.18,317.92 330.57,333.30 340.96,347.43 351.35,359.62 361.74,369.70 372.13,378.41 382.52,386.61 392.91,394.66 403.30,402.37 413.70,409.60 424.09,416.64 434.48,423.93 444.87,431.55 455.26,438.52 465.65,443.73 476.04,446.98 486.43,449.10 496.83,450.83 507.22,451.76 517.61,450.90 528.00,447.71 538.39,443.12 548.78,438.34 559.17,433.82 569.56,428.96 579.95,423.09 590.35,415.72 600.74,406.47 611.13,395.13 621.52,382.02 631.91,367.56 642.30,352.35 652.69,337.09 663.08,322.49 673.48,309.32 683.87,298.31 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,277.55 81.18,274.07 91.57,265.79 101.96,254.84 112.35,242.54 122.74,229.06 133.13,214.48 143.53,199.49 153.92,185.09 164.31,172.53 174.70,164.31 185.09,162.91 195.48,168.44 205.87,177.67 216.26,187.45 226.65,196.83 237.05,206.43 247.44,217.06 257.83,229.93 268.22,246.29 278.61,266.74 289.00,290.83 299.39,317.92 309.78,346.04 320.18,372.12 330.57,393.61 340.96,410.06 351.35,421.77 361.74,429.70 372.13,436.19 382.52,443.61 392.91,452.26 403.30,460.43 413.70,466.39 424.09,469.00 434.48,467.41 444.87,461.20 455.26,451.08 465.65,437.99 476.04,423.33 486.43,409.02 496.83,396.83 507.22,387.59 517.61,381.59 528.00,378.77 538.39,378.28 548.78,379.09 559.17,380.50 569.56,382.22 579.95,384.04 590.35,385.38 600.74,385.52 611.13,384.02 621.52,381.51 631.91,378.87 642.30,376.68 652.69,375.05 663.08,373.95 673.48,372.42 683.87,368.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,338.77 81.18,338.27 91.57,335.50 101.96,328.61 112.35,316.88 122.74,300.98 133.13,281.73 143.53,259.43 153.92,234.00 164.31,206.33 174.70,180.76 185.09,162.12 195.48,153.32 205.87,154.56 216.26,165.26 226.65,182.91 237.05,204.02 247.44,225.90 257.83,247.71 268.22,269.32 278.61,290.54 289.00,310.90 299.39,329.90 309.78,347.24 320.18,362.68 330.57,375.97 340.96,386.41 351.35,393.19 361.74,396.05 372.13,395.95 382.52,394.03 392.91,391.77 403.30,390.93 413.70,392.86 424.09,396.37 434.48,399.22 444.87,399.79 455.26,398.10 465.65,394.55 476.04,390.04 486.43,386.08 496.83,384.06 507.22,384.50 517.61,387.44 528.00,392.31 538.39,396.75 548.78,398.17 559.17,396.06 569.56,392.60 579.95,390.08 590.35,389.31 600.74,390.22 611.13,392.56 621.52,395.68 631.91,398.87 642.30,402.24 652.69,407.26 663.08,415.27 673.48,425.38 683.87,435.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,93.72 81.18,95.47 91.57,99.41 101.96,104.16 112.35,108.54 122.74,111.68 133.13,113.20 143.53,115.61 153.92,122.93 164.31,137.27 174.70,154.90 185.09,171.06 195.48,184.23 205.87,197.61 216.26,214.41 226.65,234.16 237.05,253.82 247.44,270.96 257.83,285.43 268.22,297.80 278.61,308.71 289.00,318.89 299.39,328.96 309.78,338.99 320.18,348.55 330.57,357.21 340.96,364.66 351.35,370.62 361.74,375.32 372.13,379.99 382.52,385.92 392.91,392.76 403.30,398.65 413.70,401.93 424.09,402.74 434.48,402.02 444.87,400.86 455.26,400.64 465.65,402.68 476.04,406.92 486.43,411.68 496.83,415.38 507.22,417.39 517.61,417.63 528.00,416.27 538.39,414.14 548.78,412.19 559.17,410.59 569.56,408.38 579.95,404.68 590.35,399.70 600.74,394.29 611.13,389.31 621.52,385.52 631.91,383.59 642.30,383.09 652.69,381.88 663.08,377.95 673.48,371.90 683.87,366.17 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,176.21 81.18,178.19 91.57,182.77 101.96,188.48 112.35,194.08 122.74,198.62 133.13,201.40 143.53,202.62 153.92,203.02 164.31,203.30 174.70,204.00 185.09,205.60 195.48,208.49 205.87,213.10 216.26,219.69 226.65,227.12 237.05,233.36 247.44,237.15 257.83,240.33 268.22,245.58 278.61,254.47 289.00,266.64 299.39,281.44 309.78,297.62 320.18,313.50 330.57,327.72 340.96,340.16 351.35,351.12 361.74,360.70 372.13,368.44 382.52,373.87 392.91,377.67 403.30,381.63 413.70,387.32 424.09,394.67 434.48,402.91 444.87,411.32 455.26,419.31 465.65,426.36 476.04,432.78 486.43,439.76 496.83,448.31 507.22,457.21 517.61,464.22 528.00,467.81 538.39,468.83 548.78,468.62 559.17,467.33 569.56,463.49 579.95,455.66 590.35,443.71 600.74,428.30 611.13,410.24 621.52,390.80 631.91,371.33 642.30,352.93 652.69,336.31 663.08,321.98 673.48,309.85 683.87,299.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,225.91 81.18,226.60 91.57,226.95 101.96,224.87 112.35,219.96 122.74,214.11 133.13,209.14 143.53,205.23 153.92,201.53 164.31,197.83 174.70,196.62 185.09,200.79 195.48,210.92 205.87,224.15 216.26,237.59 226.65,249.64 237.05,259.73 247.44,267.50 257.83,272.89 268.22,275.93 278.61,277.35 289.00,279.18 299.39,283.36 309.78,290.51 320.18,300.14 330.57,311.78 340.96,325.67 351.35,342.31 361.74,360.91 372.13,377.86 382.52,389.47 392.91,395.53 403.30,399.19 413.70,403.38 424.09,408.92 434.48,415.60 444.87,422.86 455.26,429.27 465.65,433.35 476.04,434.66 486.43,433.94 496.83,431.97 507.22,429.08 517.61,425.34 528.00,421.04 538.39,417.16 548.78,414.73 559.17,413.85 569.56,413.32 579.95,411.94 590.35,409.55 600.74,406.58 611.13,403.39 621.52,399.96 631.91,396.14 642.30,391.81 652.69,386.79 663.08,380.92 673.48,374.32 683.87,367.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,66.65 81.18,70.55 91.57,78.61 101.96,86.83 112.35,92.91 122.74,96.69 133.13,98.49 143.53,100.26 153.92,104.68 164.31,113.22 174.70,123.71 185.09,133.35 195.48,141.83 205.87,152.50 216.26,168.59 226.65,190.43 237.05,216.39 247.44,244.75 257.83,273.00 268.22,298.65 278.61,319.99 289.00,336.51 299.39,348.03 309.78,356.40 320.18,365.08 330.57,376.69 340.96,389.57 351.35,400.56 361.74,407.64 372.13,411.35 382.52,412.62 392.91,412.10 403.30,410.14 413.70,407.05 424.09,403.22 434.48,399.04 444.87,395.23 455.26,393.41 465.65,395.22 476.04,400.64 486.43,407.79 496.83,414.73 507.22,419.61 517.61,420.68 528.00,417.07 538.39,410.36 548.78,402.63 559.17,395.45 569.56,389.68 579.95,385.96 590.35,384.29 600.74,384.28 611.13,385.40 621.52,386.69 631.91,387.11 642.30,386.54 652.69,386.30 663.08,387.66 673.48,389.94 683.87,391.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,80.09 81.18,81.67 91.57,86.09 101.96,93.21 112.35,102.92 122.74,115.29 133.13,130.32 143.53,146.84 153.92,163.10 164.31,177.76 174.70,190.36 185.09,200.71 195.48,208.46 205.87,212.90 216.26,213.66 226.65,213.87 237.05,218.98 247.44,232.50 257.83,250.52 268.22,267.14 278.61,279.43 289.00,289.67 299.39,300.61 309.78,313.00 320.18,325.86 330.57,338.18 340.96,349.11 351.35,357.92 361.74,364.67 372.13,371.12 382.52,379.12 392.91,389.09 403.30,400.04 413.70,410.86 424.09,420.01 434.48,425.86 444.87,427.84 455.26,428.26 465.65,429.78 476.04,433.32 486.43,437.75 496.83,441.78 507.22,444.19 517.61,443.80 528.00,440.20 538.39,435.16 548.78,430.84 559.17,427.96 569.56,425.33 579.95,421.77 590.35,417.49 600.74,413.57 611.13,410.81 621.52,408.93 631.91,407.34 642.30,405.31 652.69,401.89 663.08,396.26 673.48,389.00 683.87,381.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,195.02 81.18,195.68 91.57,196.11 101.96,194.36 112.35,190.15 122.74,185.29 133.13,181.63 143.53,180.20 153.92,181.45 164.31,185.42 174.70,191.02 185.09,196.98 195.48,202.92 205.87,209.74 216.26,218.34 226.65,227.93 237.05,236.64 247.44,243.20 257.83,248.94 268.22,255.87 278.61,264.96 289.00,275.22 299.39,285.51 309.78,295.48 320.18,305.39 330.57,315.56 340.96,326.26 351.35,337.70 361.74,349.78 372.13,361.71 382.52,372.66 392.91,383.04 403.30,394.40 413.70,408.02 424.09,423.27 434.48,438.70 444.87,452.97 455.26,465.08 465.65,474.12 476.04,479.41 486.43,480.47 496.83,477.02 507.22,470.01 517.61,461.01 528.00,451.40 538.39,442.09 548.78,433.80 559.17,426.62 569.56,419.79 579.95,412.54 590.35,404.88 600.74,397.24 611.13,389.84 621.52,381.94 631.91,372.63 642.30,362.03 652.69,351.93 663.08,344.09 673.48,338.65 683.87,334.59 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,106.54 81.18,108.06 91.57,112.87 101.96,121.52 112.35,133.73 122.74,148.32 133.13,164.04 143.53,178.35 153.92,188.12 164.31,191.62 174.70,191.35 185.09,190.74 195.48,191.60 205.87,193.33 216.26,195.19 226.65,198.66 237.05,206.70 247.44,221.18 257.83,239.82 268.22,259.26 278.61,277.46 289.00,294.62 299.39,311.25 309.78,327.05 320.18,341.07 330.57,352.57 340.96,361.95 351.35,370.01 361.74,377.32 372.13,384.08 382.52,390.36 392.91,396.21 403.30,401.65 413.70,406.62 424.09,410.62 434.48,412.96 444.87,413.39 455.26,412.79 465.65,412.22 476.04,412.28 486.43,413.03 496.83,414.42 507.22,416.12 517.61,417.68 528.00,418.82 538.39,419.87 548.78,421.26 559.17,423.03 569.56,424.75 579.95,425.93 590.35,425.80 600.74,423.50 611.13,418.49 621.52,411.54 631.91,403.71 642.30,395.28 652.69,385.28 663.08,372.70 673.48,357.46 683.87,340.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,179.99 81.18,178.81 91.57,176.99 101.96,176.59 112.35,178.05 122.74,179.71 133.13,180.00 143.53,179.32 153.92,179.20 164.31,180.85 174.70,184.46 185.09,189.93 195.48,197.11 205.87,205.86 216.26,216.02 226.65,226.97 237.05,237.78 247.44,247.95 257.83,258.52 268.22,270.92 278.61,285.74 289.00,302.03 299.39,318.69 309.78,334.91 320.18,350.12 330.57,363.96 340.96,377.00 351.35,390.11 361.74,403.23 372.13,414.33 382.52,421.19 392.91,423.51 403.30,422.86 413.70,420.75 424.09,418.01 434.48,415.13 444.87,412.53 455.26,410.57 465.65,409.55 476.04,409.83 486.43,411.86 496.83,415.89 507.22,420.98 517.61,425.60 528.00,428.35 538.39,428.25 548.78,424.47 559.17,417.48 569.56,409.41 579.95,402.28 590.35,395.93 600.74,388.90 611.13,380.15 621.52,370.27 631.91,360.29 642.30,350.89 652.69,342.19 663.08,334.21 673.48,327.08 683.87,321.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,206.46 81.18,203.25 91.57,194.64 101.96,181.39 112.35,166.03 122.74,153.13 133.13,146.71 143.53,147.43 153.92,153.90 164.31,164.34 174.70,175.77 185.09,185.32 195.48,192.30 205.87,199.13 216.26,208.26 226.65,219.87 237.05,232.56 247.44,245.08 257.83,256.90 268.22,267.73 278.61,278.19 289.00,290.48 299.39,306.70 309.78,326.61 320.18,348.08 330.57,368.98 340.96,387.06 351.35,400.18 361.74,407.46 372.13,410.70 382.52,412.05 392.91,412.83 403.30,413.59 413.70,414.71 424.09,416.17 434.48,417.79 444.87,419.61 455.26,422.23 465.65,426.35 476.04,431.57 486.43,436.28 496.83,439.01 507.22,439.49 517.61,438.08 528.00,434.93 538.39,429.39 548.78,420.69 559.17,409.60 569.56,398.90 579.95,391.25 590.35,387.25 600.74,386.19 611.13,387.15 621.52,388.84 631.91,389.95 642.30,389.99 652.69,389.79 663.08,390.23 673.48,391.10 683.87,391.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,241.61 81.18,239.11 91.57,232.52 101.96,222.56 112.35,209.56 122.74,193.29 133.13,173.90 143.53,155.62 153.92,144.74 164.31,145.27 174.70,154.40 185.09,167.77 195.48,182.09 205.87,195.69 216.26,207.55 226.65,219.07 237.05,233.13 247.44,251.85 257.83,274.13 268.22,298.01 278.61,321.80 289.00,344.25 299.39,364.26 309.78,380.33 320.18,390.61 330.57,393.72 340.96,390.52 351.35,382.66 361.74,372.23 372.13,362.28 382.52,355.74 392.91,353.78 403.30,355.84 413.70,361.16 424.09,368.84 434.48,378.00 444.87,387.94 455.26,398.33 465.65,408.97 476.04,419.50 486.43,429.39 496.83,438.12 507.22,445.16 517.61,449.98 528.00,452.23 538.39,452.05 548.78,449.68 559.17,445.17 569.56,438.30 579.95,428.94 590.35,417.83 600.74,406.21 611.13,395.16 621.52,385.13 631.91,376.32 642.30,368.17 652.69,358.91 663.08,346.90 673.48,332.57 683.87,317.84 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,74.24 81.18,74.39 91.57,73.93 101.96,71.79 112.35,69.28 122.74,70.60 133.13,79.27 143.53,94.61 153.92,113.74 164.31,133.92 174.70,152.09 185.09,165.50 195.48,174.10 205.87,181.60 216.26,191.60 226.65,204.81 237.05,219.94 247.44,235.85 257.83,252.30 268.22,269.34 278.61,286.77 289.00,303.84 299.39,319.78 309.78,333.76 320.18,344.89 330.57,352.52 340.96,356.88 351.35,358.53 361.74,358.48 372.13,358.64 382.52,360.93 392.91,365.64 403.30,371.58 413.70,377.63 424.09,383.77 434.48,390.51 444.87,398.14 455.26,406.39 465.65,414.88 476.04,422.72 486.43,428.40 496.83,430.71 507.22,430.43 517.61,429.40 528.00,428.88 538.39,428.52 548.78,427.58 559.17,425.52 569.56,422.12 579.95,417.24 590.35,411.16 600.74,404.45 611.13,397.83 621.52,392.83 631.91,391.04 642.30,392.85 652.69,396.79 663.08,401.30 673.48,405.71 683.87,410.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,521.37 81.18,515.07 91.57,498.36 101.96,472.68 112.35,440.73 122.74,406.82 133.13,375.07 143.53,346.06 153.92,318.12 164.31,290.12 174.70,263.53 185.09,240.39 195.48,222.61 205.87,212.02 216.26,209.93 226.65,215.63 237.05,227.13 247.44,242.53 257.83,260.00 268.22,277.93 278.61,295.01 289.00,310.18 299.39,322.57 309.78,332.52 320.18,341.30 330.57,349.98 340.96,358.69 351.35,367.16 361.74,375.62 372.13,385.45 382.52,398.04 392.91,412.69 403.30,426.65 413.70,437.41 424.09,444.10 434.48,446.58 444.87,445.11 455.26,440.86 465.65,435.15 476.04,429.27 486.43,424.49 496.83,421.87 507.22,421.07 517.61,421.07 528.00,420.99 538.39,420.55 548.78,419.62 559.17,418.07 569.56,415.73 579.95,412.48 590.35,408.35 600.74,403.44 611.13,397.87 621.52,391.60 631.91,384.56 642.30,376.88 652.69,369.01 663.08,361.40 673.48,354.35 683.87,348.10 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,249.01 81.18,248.84 91.57,245.48 101.96,235.12 112.35,217.28 122.74,195.88 133.13,175.05 143.53,158.49 153.92,149.17 164.31,148.50 174.70,153.60 185.09,160.79 195.48,168.22 205.87,176.75 216.26,187.51 226.65,200.86 237.05,216.62 247.44,234.52 257.83,253.88 268.22,273.99 278.61,294.15 289.00,313.53 299.39,331.40 309.78,347.57 320.18,362.24 330.57,375.43 340.96,385.83 351.35,391.72 361.74,392.63 372.13,390.85 382.52,388.97 392.91,388.23 403.30,388.63 413.70,389.93 424.09,391.52 434.48,392.62 444.87,392.64 455.26,391.46 465.65,389.05 476.04,385.73 486.43,382.18 496.83,379.14 507.22,377.98 517.61,380.28 528.00,386.63 538.39,394.72 548.78,401.70 559.17,406.10 569.56,408.28 579.95,408.68 590.35,406.64 600.74,400.83 611.13,390.70 621.52,378.39 631.91,366.69 642.30,357.22 652.69,349.81 663.08,344.01 673.48,339.16 683.87,334.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,96.88 81.18,101.73 91.57,113.04 101.96,127.45 112.35,142.03 122.74,154.48 133.13,163.06 143.53,167.64 153.92,169.01 164.31,168.14 174.70,166.60 185.09,165.97 195.48,167.95 205.87,174.62 216.26,187.57 226.65,205.48 237.05,225.17 247.44,244.06 257.83,261.56 268.22,277.75 278.61,292.67 289.00,306.20 299.39,318.23 309.78,328.99 320.18,339.02 330.57,348.73 340.96,357.86 351.35,365.92 361.74,372.84 372.13,379.50 382.52,386.83 392.91,395.02 403.30,403.58 413.70,411.83 424.09,418.28 434.48,421.17 444.87,419.54 455.26,414.56 465.65,407.77 476.04,400.67 486.43,394.67 496.83,390.99 507.22,389.79 517.61,390.70 528.00,393.03 538.39,395.32 548.78,396.02 559.17,394.67 569.56,392.21 579.95,389.71 590.35,387.80 600.74,386.91 611.13,387.09 621.52,387.12 631.91,385.55 642.30,381.68 652.69,375.99 663.08,369.14 673.48,361.93 683.87,355.27 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,186.15 81.18,186.54 91.57,186.09 101.96,182.77 112.35,176.40 122.74,169.25 133.13,163.55 143.53,160.31 153.92,159.71 164.31,161.84 174.70,166.89 185.09,175.04 195.48,185.52 205.87,196.07 216.26,204.67 226.65,211.26 237.05,217.09 247.44,223.55 257.83,232.47 268.22,245.66 278.61,263.53 289.00,284.14 299.39,305.39 309.78,325.65 320.18,343.64 330.57,358.56 340.96,371.39 351.35,383.71 361.74,396.36 372.13,408.47 382.52,418.96 392.91,426.67 403.30,430.38 413.70,429.37 424.09,425.64 434.48,422.37 444.87,421.56 455.26,422.11 465.65,422.40 476.04,421.15 486.43,417.58 496.83,411.18 507.22,403.02 517.61,394.99 528.00,388.37 538.39,382.68 548.78,377.05 559.17,371.77 569.56,368.73 579.95,369.64 590.35,374.12 600.74,380.52 611.13,387.43 621.52,394.34 631.91,401.04 642.30,407.03 652.69,411.30 663.08,412.93 673.48,412.15 683.87,410.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,242.17 81.18,240.02 91.57,235.42 101.96,230.40 112.35,226.30 122.74,223.46 133.13,221.90 143.53,220.14 153.92,215.83 164.31,207.90 174.70,199.48 185.09,194.53 195.48,194.58 205.87,197.45 216.26,200.83 226.65,205.44 237.05,214.04 247.44,228.55 257.83,247.31 268.22,267.70 278.61,287.64 289.00,305.87 299.39,321.41 309.78,334.14 320.18,344.59 330.57,353.39 340.96,361.55 351.35,370.16 361.74,379.34 372.13,387.19 382.52,391.65 392.91,392.99 403.30,393.71 413.70,396.10 424.09,400.32 434.48,405.58 444.87,411.07 455.26,415.96 465.65,419.49 476.04,421.60 486.43,423.03 496.83,424.49 507.22,426.28 517.61,428.44 528.00,430.68 538.39,431.64 548.78,429.77 559.17,424.94 569.56,418.87 579.95,413.28 590.35,408.37 600.74,403.40 611.13,397.86 621.52,392.25 631.91,387.26 642.30,382.73 652.69,377.08 663.08,368.82 673.48,358.39 683.87,347.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,296.15 81.18,294.05 91.57,288.22 101.96,278.82 112.35,266.59 122.74,252.96 133.13,239.28 143.53,225.89 153.92,212.51 164.31,199.45 174.70,189.61 185.09,186.20 195.48,190.23 205.87,199.53 216.26,211.66 226.65,223.55 237.05,231.91 247.44,234.95 257.83,236.51 268.22,241.86 278.61,253.92 289.00,271.41 299.39,292.51 309.78,314.70 320.18,335.00 330.57,350.94 340.96,361.69 351.35,367.06 361.74,368.07 372.13,368.29 382.52,371.36 392.91,378.21 403.30,387.04 413.70,396.01 424.09,403.96 434.48,410.07 444.87,414.11 455.26,417.21 465.65,420.72 476.04,424.79 486.43,428.18 496.83,429.65 507.22,428.44 517.61,424.10 528.00,416.59 538.39,407.26 548.78,397.71 559.17,389.47 569.56,383.93 579.95,382.21 590.35,383.74 600.74,386.95 611.13,390.47 621.52,393.68 631.91,396.23 642.30,398.19 652.69,400.26 663.08,403.19 673.48,407.01 683.87,411.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,260.97 81.18,259.10 91.57,253.36 101.96,243.21 112.35,228.74 122.74,210.84 133.13,190.69 143.53,171.73 153.92,158.49 164.31,153.59 174.70,153.96 185.09,155.27 195.48,156.00 205.87,158.86 216.26,166.60 226.65,178.99 237.05,193.76 247.44,209.34 257.83,227.21 268.22,249.63 278.61,276.77 289.00,304.95 299.39,330.37 309.78,350.78 320.18,365.22 330.57,373.41 340.96,378.22 351.35,383.53 361.74,391.52 372.13,400.77 382.52,409.37 392.91,416.31 403.30,421.57 413.70,425.15 424.09,426.98 434.48,426.93 444.87,425.23 455.26,422.97 465.65,421.31 476.04,420.66 486.43,420.58 496.83,420.53 507.22,419.92 517.61,418.16 528.00,415.00 538.39,411.24 548.78,407.85 559.17,404.70 569.56,400.15 579.95,392.71 590.35,383.69 600.74,376.01 611.13,371.91 621.52,371.06 631.91,372.46 642.30,375.46 652.69,380.09 663.08,386.38 673.48,394.00 683.87,402.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,87.19 81.18,87.87 91.57,89.89 101.96,93.34 112.35,98.41 122.74,105.47 133.13,114.85 143.53,126.59 153.92,140.63 164.31,156.52 174.70,172.17 185.09,185.37 195.48,195.55 205.87,204.56 216.26,214.27 226.65,225.53 237.05,238.41 247.44,252.86 257.83,268.73 268.22,285.82 278.61,303.89 289.00,322.62 299.39,341.61 309.78,359.39 320.18,373.58 330.57,382.52 340.96,388.05 351.35,393.26 361.74,399.80 372.13,406.27 382.52,410.92 392.91,413.69 403.30,416.27 413.70,420.09 424.09,424.41 434.48,427.61 444.87,428.41 455.26,426.54 465.65,421.93 476.04,414.97 486.43,406.52 496.83,397.55 507.22,389.72 517.61,384.96 528.00,384.39 538.39,386.85 548.78,390.66 559.17,394.55 569.56,397.81 579.95,399.88 590.35,400.25 600.74,398.52 611.13,394.64 621.52,389.79 631.91,385.45 642.30,381.81 652.69,377.10 663.08,369.45 673.48,358.33 683.87,344.14 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,152.70 81.18,152.20 91.57,151.85 101.96,153.01 112.35,155.61 122.74,157.71 133.13,157.60 143.53,155.75 153.92,153.89 164.31,153.63 174.70,156.38 185.09,163.27 195.48,174.53 205.87,189.10 216.26,205.82 226.65,222.62 237.05,236.90 247.44,247.04 257.83,254.89 268.22,263.29 278.61,273.94 289.00,286.62 299.39,300.81 309.78,315.58 320.18,329.77 330.57,342.52 340.96,354.38 351.35,366.40 361.74,378.99 372.13,391.15 382.52,401.68 392.91,409.70 403.30,414.60 413.70,416.02 424.09,414.94 434.48,412.89 444.87,411.10 455.26,410.09 465.65,410.17 476.04,410.91 486.43,411.02 496.83,409.38 507.22,406.20 517.61,402.42 528.00,398.89 538.39,396.34 548.78,395.39 559.17,396.04 569.56,397.49 579.95,398.91 590.35,399.56 600.74,398.80 611.13,396.36 621.52,393.22 631.91,390.64 642.30,389.09 652.69,387.88 663.08,386.19 673.48,383.67 683.87,380.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,138.11 81.18,138.18 91.57,139.60 101.96,143.96 112.35,152.17 122.74,164.31 133.13,180.04 143.53,195.81 153.92,206.40 164.31,208.40 174.70,203.93 185.09,196.43 195.48,189.37 205.87,186.24 216.26,189.84 226.65,200.13 237.05,215.18 247.44,232.96 257.83,251.00 268.22,266.96 278.61,279.93 289.00,291.39 299.39,302.98 309.78,315.31 320.18,328.04 330.57,340.78 340.96,352.95 351.35,363.95 361.74,373.24 372.13,380.24 382.52,384.53 392.91,387.11 403.30,390.37 413.70,396.34 424.09,404.56 434.48,413.49 444.87,421.64 455.26,427.58 465.65,430.04 476.04,429.41 486.43,427.95 496.83,427.78 507.22,429.08 517.61,431.01 528.00,432.79 538.39,434.10 548.78,434.66 559.17,434.14 569.56,432.08 579.95,428.05 590.35,421.71 600.74,412.80 611.13,401.37 621.52,388.73 631.91,376.45 642.30,365.23 652.69,354.47 663.08,343.46 673.48,331.98 683.87,320.21 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,247.63 81.18,244.47 91.57,236.68 101.96,225.86 112.35,213.38 122.74,200.18 133.13,187.14 143.53,175.90 153.92,168.43 164.31,165.91 174.70,167.25 185.09,170.86 195.48,176.22 205.87,184.45 216.26,196.64 226.65,211.91 237.05,228.08 247.44,243.28 257.83,256.51 268.22,267.16 278.61,275.60 289.00,284.04 299.39,294.58 309.78,306.82 320.18,318.34 330.57,327.15 340.96,333.85 351.35,339.96 361.74,346.44 372.13,353.02 382.52,359.27 392.91,365.55 403.30,372.98 413.70,382.39 424.09,392.67 434.48,401.91 444.87,409.00 455.26,414.89 465.65,420.86 476.04,426.89 486.43,431.45 496.83,433.17 507.22,432.53 517.61,430.94 528.00,429.56 538.39,428.64 548.78,428.23 559.17,428.31 569.56,428.81 579.95,429.57 590.35,429.94 600.74,429.00 611.13,425.74 621.52,418.97 631.91,407.51 642.30,391.55 652.69,373.36 663.08,355.32 673.48,339.00 683.87,325.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,151.73 81.18,153.10 91.57,156.02 101.96,159.23 112.35,162.12 122.74,164.94 133.13,168.04 143.53,171.95 153.92,177.22 164.31,183.84 174.70,189.77 185.09,192.68 195.48,192.12 205.87,190.46 216.26,190.23 226.65,194.37 237.05,205.85 247.44,226.10 257.83,250.75 268.22,274.10 278.61,292.90 289.00,308.01 299.39,320.82 309.78,332.56 320.18,344.27 330.57,356.57 340.96,368.08 351.35,376.79 361.74,381.62 372.13,383.52 382.52,383.77 392.91,383.97 403.30,385.97 413.70,391.30 424.09,399.69 434.48,410.10 444.87,421.33 455.26,431.70 465.65,439.58 476.04,444.10 486.43,445.25 496.83,443.16 507.22,438.54 517.61,432.36 528.00,425.66 538.39,419.64 548.78,415.43 559.17,412.91 569.56,410.30 579.95,405.89 590.35,399.60 600.74,392.39 611.13,385.15 621.52,378.34 631.91,372.29 642.30,366.68 652.69,360.21 663.08,351.62 673.48,340.74 683.87,328.19 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,91.46 81.18,96.07 91.57,105.67 101.96,115.69 112.35,124.84 122.74,136.14 133.13,152.34 143.53,171.71 153.92,190.09 164.31,204.17 174.70,212.88 185.09,215.88 195.48,214.10 205.87,210.32 216.26,207.33 226.65,208.00 237.05,215.14 247.44,230.09 257.83,249.21 268.22,267.62 278.61,282.83 289.00,296.43 299.39,310.38 309.78,324.84 320.18,338.46 330.57,350.02 340.96,359.27 351.35,366.37 361.74,371.75 372.13,376.61 382.52,382.14 392.91,389.04 403.30,397.53 413.70,407.60 424.09,417.85 434.48,426.37 444.87,432.21 455.26,436.92 465.65,442.41 476.04,448.99 486.43,455.12 496.83,459.26 507.22,460.54 517.61,458.53 528.00,453.29 538.39,446.32 548.78,439.40 559.17,433.56 569.56,428.86 579.95,425.17 590.35,421.45 600.74,416.15 611.13,408.00 621.52,396.63 631.91,381.97 642.30,364.16 652.69,343.58 663.08,320.81 673.48,297.75 683.87,277.16 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,189.98 81.18,190.73 91.57,193.18 101.96,197.75 112.35,203.17 122.74,206.07 133.13,203.45 143.53,195.60 153.92,184.74 164.31,173.24 174.70,163.98 185.09,159.59 195.48,160.84 205.87,165.92 216.26,172.99 226.65,182.36 237.05,195.83 247.44,214.50 257.83,236.39 268.22,258.78 278.61,279.69 289.00,298.27 299.39,313.97 309.78,327.24 320.18,339.32 330.57,351.22 340.96,362.73 351.35,373.22 361.74,382.45 372.13,391.03 382.52,399.65 392.91,408.16 403.30,415.57 413.70,421.01 424.09,424.60 434.48,426.90 444.87,428.26 455.26,428.60 465.65,427.71 476.04,425.43 486.43,421.60 496.83,416.16 507.22,409.70 517.61,403.15 528.00,397.54 538.39,394.36 548.78,395.05 559.17,399.07 569.56,403.35 579.95,404.88 590.35,403.09 600.74,398.85 611.13,393.12 621.52,386.77 631.91,380.61 642.30,375.33 652.69,371.44 663.08,369.33 673.48,369.20 683.87,371.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,157.16 81.18,158.51 91.57,162.15 101.96,167.79 112.35,173.96 122.74,177.69 133.13,176.56 143.53,171.72 153.92,166.34 164.31,163.07 174.70,162.84 185.09,165.96 195.48,172.88 205.87,184.41 216.26,201.08 226.65,220.16 237.05,236.87 247.44,247.86 257.83,254.88 268.22,261.17 278.61,269.01 289.00,278.97 299.39,291.22 309.78,305.00 320.18,318.87 330.57,331.45 340.96,341.62 351.35,348.40 361.74,352.12 372.13,355.89 382.52,362.98 392.91,374.63 403.30,390.06 413.70,408.25 424.09,427.33 434.48,445.20 444.87,460.02 455.26,470.61 465.65,475.97 476.04,476.07 486.43,471.92 496.83,464.67 507.22,455.69 517.61,446.39 528.00,437.78 538.39,429.52 548.78,421.01 559.17,412.02 569.56,402.78 579.95,393.58 590.35,384.52 600.74,375.62 611.13,366.88 621.52,358.28 631.91,349.81 642.30,341.65 652.69,334.25 663.08,328.01 673.48,322.10 683.87,314.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,64.02 81.18,64.55 91.57,67.24 101.96,73.53 112.35,83.48 122.74,95.48 133.13,108.01 143.53,119.98 153.92,130.58 164.31,139.56 174.70,148.16 185.09,157.84 195.48,169.09 205.87,180.87 216.26,192.17 226.65,203.08 237.05,214.42 247.44,226.98 257.83,241.46 268.22,258.46 278.61,278.28 289.00,300.73 299.39,325.48 309.78,350.39 320.18,371.86 330.57,386.97 340.96,396.01 351.35,400.42 361.74,401.62 372.13,401.03 382.52,399.95 392.91,399.11 403.30,398.69 413.70,398.83 424.09,399.90 434.48,402.35 444.87,406.37 455.26,411.49 465.65,417.12 476.04,422.61 486.43,427.22 496.83,430.32 507.22,431.98 517.61,432.62 528.00,432.60 538.39,432.16 548.78,431.43 559.17,430.05 569.56,426.94 579.95,421.07 590.35,412.05 600.74,399.91 611.13,384.79 621.52,367.20 631.91,347.78 642.30,327.40 652.69,307.33 663.08,288.72 673.48,271.63 683.87,255.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,187.69 81.18,188.07 91.57,188.29 101.96,187.24 112.35,184.69 122.74,181.53 133.13,178.68 143.53,176.70 153.92,175.91 164.31,176.31 174.70,176.82 185.09,176.26 195.48,175.77 205.87,180.07 216.26,193.37 226.65,213.99 237.05,236.43 247.44,256.35 257.83,273.53 268.22,289.12 278.61,303.62 289.00,316.32 299.39,326.40 309.78,333.66 320.18,338.46 330.57,341.44 340.96,344.85 351.35,351.42 361.74,361.85 372.13,372.54 382.52,379.52 392.91,382.66 403.30,385.51 413.70,391.27 424.09,399.92 434.48,409.99 444.87,419.77 455.26,426.89 465.65,429.07 476.04,427.10 486.43,425.27 496.83,427.42 507.22,432.14 517.61,435.38 528.00,434.24 538.39,429.56 548.78,423.01 559.17,415.67 569.56,407.83 579.95,399.70 590.35,391.91 600.74,385.29 611.13,380.29 621.52,376.05 631.91,371.44 642.30,365.86 652.69,359.62 663.08,353.13 673.48,346.72 683.87,340.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,98.20 81.18,100.66 91.57,107.09 101.96,116.67 112.35,128.60 122.74,142.17 133.13,156.71 143.53,170.67 153.92,182.07 164.31,189.57 174.70,193.56 185.09,194.85 195.48,195.33 205.87,198.47 216.26,207.25 226.65,220.42 237.05,233.95 247.44,244.79 257.83,254.00 268.22,263.82 278.61,275.45 289.00,288.18 299.39,301.07 309.78,313.67 320.18,325.95 330.57,337.78 340.96,348.30 351.35,356.46 361.74,361.80 372.13,365.14 382.52,367.50 392.91,370.25 403.30,375.05 413.70,383.16 424.09,393.46 434.48,403.90 444.87,412.99 455.26,420.77 465.65,427.56 476.04,433.92 486.43,440.57 496.83,448.05 507.22,455.26 517.61,460.29 528.00,461.91 538.39,460.96 548.78,458.73 559.17,455.83 569.56,451.90 579.95,446.55 590.35,439.68 600.74,431.42 611.13,421.69 621.52,409.73 631.91,394.62 642.30,376.19 652.69,355.46 663.08,333.54 673.48,310.95 683.87,287.84 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,219.15 81.18,219.19 91.57,217.71 101.96,212.63 112.35,203.57 122.74,192.32 133.13,180.72 143.53,169.45 153.92,158.40 164.31,148.17 174.70,142.34 185.09,144.80 195.48,156.02 205.87,171.59 216.26,187.28 226.65,202.27 237.05,218.15 247.44,236.19 257.83,255.82 268.22,275.97 278.61,294.73 289.00,308.54 299.39,314.26 309.78,314.50 320.18,316.56 330.57,326.22 340.96,341.51 351.35,357.61 361.74,371.21 372.13,382.25 382.52,391.22 392.91,398.34 403.30,403.58 413.70,406.88 424.09,408.28 434.48,407.85 444.87,406.04 455.26,404.29 465.65,404.16 476.04,405.99 486.43,408.82 496.83,411.67 507.22,414.36 517.61,417.13 528.00,419.98 538.39,422.11 548.78,422.57 559.17,420.64 569.56,415.96 579.95,408.33 590.35,399.02 600.74,390.15 611.13,383.24 621.52,377.64 631.91,372.08 642.30,365.73 652.69,358.50 663.08,350.41 673.48,341.54 683.87,332.01 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,238.57 81.18,236.75 91.57,232.39 101.96,226.59 112.35,219.50 122.74,209.94 133.13,197.11 143.53,184.25 153.92,176.80 164.31,178.16 174.70,185.15 185.09,193.14 195.48,199.73 205.87,205.90 216.26,212.88 226.65,220.52 237.05,227.64 247.44,233.64 257.83,240.70 268.22,251.63 278.61,267.75 289.00,287.82 299.39,310.28 309.78,332.81 320.18,352.49 330.57,366.97 340.96,376.04 351.35,380.27 361.74,380.86 372.13,380.27 382.52,381.00 392.91,383.78 403.30,387.69 413.70,391.74 424.09,395.57 434.48,399.08 444.87,402.40 455.26,406.13 465.65,410.96 476.04,416.50 486.43,421.26 496.83,423.89 507.22,424.76 517.61,425.09 528.00,425.78 538.39,426.60 548.78,427.10 559.17,427.05 569.56,426.50 579.95,425.45 590.35,423.00 600.74,417.76 611.13,408.83 621.52,397.21 631.91,384.36 642.30,371.46 652.69,359.23 663.08,348.26 673.48,338.59 683.87,329.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,147.12 81.18,144.11 91.57,137.78 101.96,131.11 112.35,126.41 122.74,125.07 133.13,127.93 143.53,134.26 153.92,142.47 164.31,151.26 174.70,160.04 185.09,168.48 195.48,176.59 205.87,184.78 216.26,193.47 226.65,203.23 237.05,214.68 247.44,228.27 257.83,243.94 268.22,261.50 278.61,280.62 289.00,300.71 299.39,321.21 309.78,341.35 320.18,360.21 330.57,376.85 340.96,389.90 351.35,397.84 361.74,400.37 372.13,399.78 382.52,398.63 392.91,398.67 403.30,400.87 413.70,405.82 424.09,412.61 434.48,419.68 444.87,425.71 455.26,429.97 465.65,431.94 476.04,431.68 486.43,429.90 496.83,427.36 507.22,424.57 517.61,421.91 528.00,419.51 538.39,416.77 548.78,412.92 559.17,407.73 569.56,401.64 579.95,395.12 590.35,388.51 600.74,382.05 611.13,375.95 621.52,370.37 631.91,365.46 642.30,361.37 652.69,358.32 663.08,356.45 673.48,355.27 683.87,353.79 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,127.15 81.18,125.85 91.57,123.17 101.96,120.45 112.35,119.71 122.74,123.78 133.13,134.79 143.53,150.90 153.92,168.18 164.31,183.52 174.70,195.69 185.09,204.13 195.48,209.40 205.87,213.65 216.26,218.87 226.65,225.15 237.05,231.27 247.44,236.47 257.83,242.53 268.22,251.80 278.61,265.24 289.00,281.34 299.39,298.37 309.78,314.90 320.18,329.77 330.57,342.08 340.96,351.73 351.35,358.92 361.74,364.06 372.13,368.09 382.52,371.93 392.91,376.30 403.30,381.74 413.70,388.48 424.09,395.19 434.48,399.90 444.87,401.48 455.26,400.92 465.65,399.60 476.04,398.71 486.43,399.24 496.83,401.91 507.22,405.96 517.61,409.88 528.00,412.62 538.39,414.58 548.78,416.50 559.17,419.00 569.56,422.55 579.95,427.44 590.35,432.54 600.74,435.89 611.13,435.98 621.52,432.75 631.91,426.62 642.30,418.53 652.69,410.25 663.08,403.47 673.48,398.53 683.87,394.77 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,224.07 81.18,221.51 91.57,215.20 101.96,206.43 112.35,196.47 122.74,186.46 133.13,177.39 143.53,170.20 153.92,165.75 164.31,164.40 174.70,165.11 185.09,166.58 195.48,169.13 205.87,175.44 216.26,187.99 226.65,206.05 237.05,226.80 247.44,247.87 257.83,268.26 268.22,287.50 278.61,305.02 289.00,319.87 299.39,331.19 309.78,339.53 320.18,346.56 330.57,353.73 340.96,361.38 351.35,369.38 361.74,377.27 372.13,383.84 382.52,387.92 392.91,389.98 403.30,392.12 413.70,396.08 424.09,400.87 434.48,404.34 444.87,405.55 455.26,406.77 465.65,410.71 476.04,418.06 486.43,427.22 496.83,436.42 507.22,443.91 517.61,447.96 528.00,447.63 538.39,444.30 548.78,439.80 559.17,435.12 569.56,430.02 579.95,424.15 590.35,417.10 600.74,408.44 611.13,398.10 621.52,387.27 631.91,377.41 642.30,369.39 652.69,363.12 663.08,358.37 673.48,354.71 683.87,351.60 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,96.68 81.18,98.04 91.57,99.99 101.96,100.04 112.35,98.45 122.74,98.95 133.13,104.74 143.53,114.77 153.92,125.63 164.31,134.83 174.70,142.51 185.09,149.54 195.48,156.93 205.87,165.82 216.26,177.12 226.65,190.16 237.05,203.22 247.44,215.30 257.83,228.35 268.22,245.04 278.61,266.31 289.00,290.09 299.39,314.06 309.78,336.27 320.18,355.11 330.57,369.37 340.96,379.56 351.35,386.76 361.74,392.19 372.13,397.38 382.52,403.75 392.91,411.23 403.30,418.31 413.70,423.74 424.09,428.46 434.48,434.32 444.87,442.21 455.26,450.48 465.65,457.08 476.04,460.92 486.43,462.00 496.83,460.44 507.22,456.37 517.61,449.96 528.00,441.45 538.39,431.41 548.78,420.48 559.17,409.04 569.56,397.17 579.95,384.95 590.35,373.12 600.74,362.76 611.13,354.69 621.52,348.81 631.91,344.72 642.30,342.00 652.69,340.18 663.08,338.80 673.48,337.47 683.87,335.84 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,61.48 81.18,63.63 91.57,67.67 101.96,70.94 112.35,73.37 122.74,78.22 133.13,88.30 143.53,102.65 153.92,118.33 164.31,133.19 174.70,147.30 185.09,161.35 195.48,175.42 205.87,188.67 216.26,200.33 226.65,211.06 237.05,222.45 247.44,235.84 257.83,251.66 268.22,270.05 278.61,290.17 289.00,309.38 299.39,325.20 309.78,337.49 320.18,348.07 330.57,358.52 340.96,368.82 351.35,378.35 361.74,386.73 372.13,394.14 382.52,400.83 392.91,406.83 403.30,411.96 413.70,416.10 424.09,419.46 434.48,422.40 444.87,424.92 455.26,426.02 465.65,424.60 476.04,420.66 486.43,415.40 496.83,410.08 507.22,405.52 517.61,402.33 528.00,400.79 538.39,400.31 548.78,400.14 559.17,399.86 569.56,399.50 579.95,399.15 590.35,399.15 600.74,399.98 611.13,401.77 621.52,403.35 631.91,403.27 642.30,400.76 652.69,396.06 663.08,389.58 673.48,381.68 683.87,372.72 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,177.60 81.18,174.33 91.57,168.21 101.96,163.42 112.35,161.95 122.74,162.82 133.13,164.75 143.53,166.60 153.92,167.40 164.31,166.85 174.70,166.64 185.09,168.82 195.48,173.86 205.87,179.83 216.26,184.90 226.65,189.62 237.05,196.15 247.44,206.40 257.83,221.26 268.22,241.25 278.61,265.50 289.00,290.68 299.39,313.57 309.78,332.85 320.18,348.75 330.57,361.61 340.96,371.85 351.35,379.89 361.74,386.39 372.13,392.59 382.52,399.71 392.91,407.77 403.30,415.62 413.70,422.18 424.09,427.05 434.48,430.17 444.87,431.56 455.26,431.55 465.65,430.52 476.04,428.98 486.43,427.64 496.83,427.03 507.22,426.60 517.61,425.24 528.00,422.41 538.39,419.28 548.78,417.34 559.17,417.09 569.56,417.67 579.95,418.11 590.35,417.56 600.74,415.29 611.13,410.72 621.52,403.82 631.91,394.68 642.30,383.42 652.69,370.09 663.08,354.87 673.48,339.07 683.87,324.76 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,149.62 81.18,151.45 91.57,154.72 101.96,156.92 112.35,157.41 122.74,157.99 133.13,160.38 143.53,164.10 153.92,167.45 164.31,169.63 174.70,173.14 185.09,181.04 195.48,194.06 205.87,209.43 216.26,224.36 226.65,238.05 237.05,251.08 247.44,263.97 257.83,276.61 268.22,288.69 278.61,299.93 289.00,310.08 299.39,318.93 309.78,325.97 320.18,330.48 330.57,332.03 340.96,331.51 351.35,330.30 361.74,329.83 372.13,331.83 382.52,337.82 392.91,348.03 403.30,361.40 413.70,376.70 424.09,391.64 434.48,403.64 444.87,411.25 455.26,415.87 465.65,419.35 476.04,422.34 486.43,424.06 496.83,423.77 507.22,421.78 517.61,418.93 528.00,416.01 538.39,413.77 548.78,412.87 559.17,413.32 569.56,414.26 579.95,414.84 590.35,414.48 600.74,412.85 611.13,409.69 621.52,404.90 631.91,398.47 642.30,390.78 652.69,382.76 663.08,375.30 673.48,367.99 683.87,359.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,260.34 81.18,257.12 91.57,248.97 101.96,237.26 112.35,223.73 122.74,210.48 133.13,199.24 143.53,189.48 153.92,179.33 164.31,167.68 174.70,156.20 185.09,147.16 195.48,143.23 205.87,147.73 216.26,163.18 226.65,187.21 237.05,214.38 247.44,240.54 257.83,265.13 268.22,288.83 278.61,311.38 289.00,330.64 299.39,344.50 309.78,353.44 320.18,360.09 330.57,366.64 340.96,372.92 351.35,377.88 361.74,381.19 372.13,384.15 382.52,388.18 392.91,393.19 403.30,397.62 413.70,400.14 424.09,401.25 434.48,402.20 444.87,403.84 455.26,405.90 465.65,407.91 476.04,409.69 486.43,411.43 496.83,413.29 507.22,415.16 517.61,416.75 528.00,417.75 538.39,417.81 548.78,416.56 559.17,414.19 569.56,411.51 579.95,409.25 590.35,406.88 600.74,403.16 611.13,397.29 621.52,390.32 631.91,383.69 642.30,378.54 652.69,375.47 663.08,374.90 673.48,376.62 683.87,379.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,125.46 81.18,125.59 91.57,126.04 101.96,126.87 112.35,127.88 122.74,128.52 133.13,128.35 143.53,128.12 153.92,129.13 164.31,132.31 174.70,137.32 185.09,143.54 195.48,151.65 205.87,164.25 216.26,183.58 226.65,207.69 237.05,231.87 247.44,252.53 257.83,269.67 268.22,284.41 278.61,298.05 289.00,312.08 299.39,327.81 309.78,344.46 320.18,359.61 330.57,371.18 340.96,378.90 351.35,383.20 361.74,384.87 372.13,385.55 382.52,386.85 392.91,389.01 403.30,390.92 413.70,391.72 424.09,392.51 434.48,395.25 444.87,400.94 455.26,408.15 465.65,415.09 476.04,421.09 486.43,426.82 496.83,432.99 507.22,439.74 517.61,446.92 528.00,453.93 538.39,458.86 548.78,459.58 559.17,455.59 569.56,448.47 579.95,439.90 590.35,430.40 600.74,419.77 611.13,407.97 621.52,395.70 631.91,383.83 642.30,373.10 652.69,364.04 663.08,357.10 673.48,352.33 683.87,349.53 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,169.10 81.18,166.98 91.57,164.06 101.96,164.43 112.35,169.26 122.74,175.90 133.13,181.68 143.53,185.30 153.92,186.35 164.31,185.17 174.70,184.40 185.09,187.02 195.48,193.95 205.87,203.13 216.26,212.45 226.65,222.18 237.05,234.21 247.44,249.57 257.83,265.39 268.22,277.83 278.61,285.35 289.00,290.54 299.39,296.32 309.78,303.72 320.18,312.22 330.57,321.36 340.96,331.74 351.35,344.30 361.74,359.18 372.13,374.84 382.52,389.57 392.91,401.88 403.30,410.59 413.70,414.84 424.09,415.81 434.48,415.51 444.87,415.41 455.26,415.67 465.65,416.14 476.04,416.46 486.43,415.98 496.83,414.12 507.22,410.96 517.61,406.91 528.00,402.45 538.39,398.25 548.78,395.01 559.17,392.86 569.56,391.31 579.95,389.92 590.35,389.57 600.74,391.91 611.13,397.85 621.52,405.70 631.91,413.15 642.30,418.92 652.69,423.26 663.08,426.60 673.48,428.96 683.87,430.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,229.55 81.18,229.39 91.57,227.12 101.96,220.38 112.35,209.43 122.74,198.01 133.13,189.68 143.53,185.58 153.92,185.25 164.31,187.83 174.70,191.50 185.09,194.41 195.48,196.61 205.87,200.95 216.26,210.07 226.65,222.92 237.05,235.90 247.44,246.45 257.83,256.13 268.22,267.68 278.61,282.27 289.00,298.24 299.39,313.66 309.78,327.59 320.18,339.85 330.57,350.36 340.96,358.91 351.35,365.26 361.74,369.91 372.13,374.97 382.52,382.58 392.91,392.73 403.30,403.32 413.70,412.34 424.09,418.97 434.48,422.90 444.87,424.34 455.26,424.78 465.65,425.81 476.04,427.53 486.43,428.27 496.83,426.55 507.22,422.78 517.61,418.39 528.00,414.59 538.39,412.14 548.78,411.58 559.17,412.89 569.56,415.25 579.95,417.76 590.35,419.20 600.74,418.18 611.13,413.55 621.52,404.77 631.91,391.53 642.30,374.56 652.69,356.18 663.08,338.76 673.48,324.00 683.87,313.00 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,498.24 81.18,495.26 91.57,483.52 101.96,458.45 112.35,421.01 122.74,379.74 133.13,343.19 143.53,313.24 153.92,287.41 164.31,263.41 174.70,241.07 185.09,220.75 195.48,203.81 205.87,193.25 216.26,191.64 226.65,198.28 237.05,210.31 247.44,225.20 257.83,241.61 268.22,258.76 278.61,276.34 289.00,294.66 299.39,314.08 309.78,333.38 320.18,350.09 330.57,362.32 340.96,371.17 351.35,378.72 361.74,386.81 372.13,396.71 382.52,409.39 392.91,423.18 403.30,433.90 413.70,437.97 424.09,436.01 434.48,430.44 444.87,423.26 455.26,415.07 465.65,406.25 476.04,397.63 486.43,390.57 496.83,386.27 507.22,384.59 517.61,384.67 528.00,385.62 538.39,386.39 548.78,386.00 559.17,384.18 569.56,381.64 579.95,379.08 590.35,376.73 600.74,374.47 611.13,372.03 621.52,368.51 631.91,362.93 642.30,355.30 652.69,347.10 663.08,339.82 673.48,333.74 683.87,328.23 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,67.96 81.18,71.23 91.57,78.39 101.96,86.58 112.35,94.76 122.74,104.23 133.13,116.18 143.53,129.22 153.92,140.58 164.31,148.84 174.70,157.04 185.09,168.99 195.48,185.26 205.87,201.59 216.26,213.92 226.65,222.85 237.05,232.14 247.44,244.66 257.83,259.34 268.22,273.95 278.61,287.39 289.00,300.58 299.39,314.61 309.78,329.68 320.18,345.23 330.57,360.48 340.96,373.50 351.35,382.06 361.74,385.34 372.13,385.63 382.52,385.60 392.91,386.95 403.30,390.48 413.70,396.61 424.09,404.32 434.48,412.01 444.87,418.25 455.26,421.99 465.65,422.41 476.04,419.92 486.43,416.36 496.83,413.43 507.22,411.63 517.61,410.78 528.00,410.54 538.39,410.17 548.78,408.86 559.17,406.45 569.56,403.62 579.95,401.07 590.35,399.18 600.74,398.08 611.13,397.70 621.52,397.28 631.91,395.89 642.30,393.39 652.69,390.90 663.08,389.53 673.48,389.12 683.87,388.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,227.37 81.18,225.69 91.57,220.78 101.96,212.47 112.35,201.02 122.74,187.15 133.13,171.78 143.53,157.75 153.92,148.76 164.31,147.16 174.70,151.45 185.09,159.23 195.48,168.70 205.87,178.95 216.26,189.42 226.65,200.21 237.05,211.84 247.44,224.69 257.83,238.51 268.22,252.91 278.61,267.83 289.00,283.94 299.39,301.87 309.78,321.00 320.18,339.75 330.57,356.68 340.96,371.19 351.35,382.97 361.74,391.82 372.13,397.74 382.52,400.79 392.91,401.77 403.30,402.20 413.70,403.43 424.09,405.90 434.48,409.62 444.87,414.26 455.26,418.76 465.65,421.97 476.04,423.13 486.43,421.98 496.83,418.42 507.22,413.54 517.61,408.98 528.00,405.86 538.39,403.71 548.78,401.74 559.17,399.45 569.56,396.79 579.95,393.74 590.35,390.30 600.74,386.42 611.13,382.29 621.52,378.88 631.91,377.30 642.30,377.98 652.69,380.30 663.08,383.54 673.48,387.50 683.87,392.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,141.55 81.18,142.58 91.57,144.76 101.96,147.13 112.35,149.39 122.74,152.12 133.13,155.86 143.53,160.04 153.92,163.49 164.31,165.27 174.70,165.11 185.09,162.98 195.48,160.35 205.87,160.93 216.26,168.03 226.65,182.00 237.05,201.18 247.44,223.71 257.83,246.62 268.22,266.91 278.61,283.37 289.00,297.74 299.39,311.99 309.78,326.87 320.18,342.08 330.57,357.17 340.96,371.27 351.35,383.37 361.74,392.80 372.13,399.63 382.52,404.08 392.91,407.31 403.30,411.37 413.70,417.78 424.09,424.77 434.48,429.17 444.87,429.09 455.26,425.95 465.65,421.75 476.04,417.79 486.43,414.60 496.83,412.54 507.22,411.63 517.61,411.70 528.00,412.39 538.39,412.79 548.78,411.92 559.17,409.69 569.56,407.17 579.95,405.43 590.35,404.77 600.74,404.99 611.13,405.66 621.52,405.63 631.91,403.57 642.30,398.94 652.69,392.36 663.08,384.59 673.48,376.55 683.87,369.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,155.69 81.18,154.86 91.57,153.19 101.96,151.65 112.35,151.43 122.74,153.99 133.13,160.40 143.53,169.20 153.92,177.59 164.31,183.60 174.70,187.70 185.09,190.99 195.48,194.70 205.87,200.21 216.26,208.64 226.65,219.67 237.05,232.03 247.44,244.81 257.83,258.66 268.22,274.71 278.61,293.10 289.00,312.25 299.39,330.46 309.78,346.27 320.18,358.38 330.57,365.93 340.96,369.89 351.35,371.85 361.74,373.08 372.13,374.24 382.52,375.84 392.91,378.32 403.30,382.12 413.70,387.39 424.09,392.70 434.48,395.98 444.87,396.30 455.26,395.62 465.65,396.30 476.04,399.18 486.43,403.29 496.83,407.67 507.22,412.47 517.61,418.41 528.00,425.72 538.39,433.15 548.78,439.18 559.17,443.07 569.56,445.09 579.95,445.58 590.35,444.39 600.74,441.11 611.13,435.65 621.52,429.11 631.91,422.84 642.30,417.41 652.69,412.08 663.08,406.06 673.48,399.47 683.87,393.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,159.53 81.18,160.86 91.57,163.50 101.96,165.95 112.35,166.99 122.74,165.84 133.13,162.12 143.53,158.11 153.92,157.48 164.31,162.42 174.70,170.54 185.09,178.44 195.48,185.02 205.87,192.52 216.26,203.25 226.65,217.05 237.05,232.09 247.44,247.01 257.83,262.54 268.22,280.03 278.61,299.55 289.00,318.89 299.39,335.75 309.78,349.19 320.18,359.35 330.57,366.54 340.96,371.42 351.35,374.72 361.74,377.50 372.13,381.50 382.52,388.38 392.91,398.10 403.30,408.94 413.70,419.25 424.09,427.92 434.48,434.19 444.87,437.62 455.26,438.56 465.65,437.49 476.04,434.56 486.43,429.50 496.83,422.22 507.22,414.06 517.61,407.04 528.00,402.67 538.39,400.94 548.78,401.44 559.17,403.25 569.56,404.82 579.95,404.73 590.35,402.85 600.74,399.84 611.13,396.30 621.52,392.34 631.91,387.97 642.30,383.66 652.69,380.60 663.08,379.92 673.48,381.52 683.87,384.46 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,99.62 81.18,99.45 91.57,100.48 101.96,104.66 112.35,112.48 122.74,122.64 133.13,133.87 143.53,145.67 153.92,158.05 164.31,170.69 174.70,181.84 185.09,189.54 195.48,193.61 205.87,196.38 216.26,200.28 226.65,207.11 237.05,218.18 247.44,234.14 257.83,253.53 268.22,274.39 278.61,295.12 289.00,314.69 299.39,332.29 309.78,347.92 320.18,362.24 330.57,375.59 340.96,386.59 351.35,393.28 361.74,394.67 372.13,391.97 382.52,386.69 392.91,380.88 403.30,377.00 413.70,377.00 424.09,380.08 434.48,384.22 444.87,388.21 455.26,393.01 465.65,399.91 476.04,408.93 486.43,418.62 496.83,427.56 507.22,434.67 517.61,439.13 528.00,440.66 538.39,440.52 548.78,440.26 559.17,440.05 569.56,438.18 579.95,433.02 590.35,424.83 600.74,415.02 611.13,404.88 621.52,395.10 631.91,386.17 642.30,378.35 652.69,371.50 663.08,365.47 673.48,360.28 683.87,356.06 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,107.43 81.18,109.40 91.57,114.14 101.96,120.55 112.35,127.72 122.74,135.11 133.13,142.29 143.53,148.76 153.92,153.98 164.31,157.54 174.70,159.25 185.09,159.01 195.48,158.27 205.87,160.78 216.26,169.90 226.65,185.79 237.05,206.50 247.44,230.02 257.83,253.74 268.22,275.14 278.61,292.74 289.00,306.61 299.39,317.12 309.78,324.96 320.18,331.10 330.57,336.45 340.96,342.00 351.35,348.71 361.74,357.17 372.13,367.36 382.52,379.06 392.91,391.03 403.30,401.06 413.70,407.38 424.09,410.95 434.48,413.93 444.87,417.80 455.26,422.25 465.65,426.65 476.04,430.66 486.43,434.28 496.83,437.49 507.22,439.87 517.61,440.83 528.00,439.94 538.39,437.25 548.78,432.98 559.17,427.78 569.56,422.94 579.95,419.60 590.35,417.29 600.74,414.58 611.13,410.17 621.52,403.30 631.91,393.39 642.30,381.03 652.69,368.51 663.08,358.12 673.48,350.80 683.87,346.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,104.96 81.18,106.67 91.57,110.34 101.96,114.35 112.35,118.14 122.74,122.51 133.13,128.25 143.53,135.16 153.92,142.49 164.31,149.69 174.70,156.94 185.09,164.59 195.48,172.44 205.87,179.43 216.26,184.67 226.65,189.17 237.05,195.19 247.44,204.29 257.83,215.38 268.22,226.64 278.61,237.63 289.00,250.40 299.39,267.09 309.78,287.68 320.18,310.48 330.57,333.77 340.96,355.62 351.35,374.15 361.74,388.48 372.13,399.78 382.52,409.47 392.91,418.20 403.30,425.86 413.70,432.25 424.09,437.05 434.48,439.88 444.87,440.57 455.26,439.65 465.65,437.71 476.04,435.39 486.43,433.39 496.83,432.28 507.22,432.20 517.61,433.02 528.00,434.36 538.39,435.06 548.78,433.85 559.17,430.47 569.56,425.96 579.95,421.37 590.35,416.56 600.74,410.61 611.13,402.84 621.52,393.36 631.91,382.55 642.30,370.90 652.69,359.10 663.08,347.78 673.48,336.71 683.87,325.08 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,71.13 81.18,73.84 91.57,78.84 101.96,82.63 112.35,84.61 122.74,87.89 133.13,95.30 143.53,106.58 153.92,119.76 164.31,133.39 174.70,147.61 185.09,162.96 195.48,179.00 205.87,193.74 216.26,205.45 226.65,215.72 237.05,228.30 247.44,245.72 257.83,265.45 268.22,283.64 278.61,298.03 289.00,309.22 299.39,318.14 309.78,325.50 320.18,331.74 330.57,337.25 340.96,342.53 351.35,348.06 361.74,354.23 372.13,361.34 382.52,369.59 392.91,378.81 403.30,388.47 413.70,397.98 424.09,406.41 434.48,412.73 444.87,416.52 455.26,419.00 465.65,421.56 476.04,424.49 486.43,426.67 496.83,427.16 507.22,426.68 517.61,426.83 528.00,428.43 538.39,429.76 548.78,428.66 559.17,424.58 569.56,419.21 579.95,414.20 590.35,409.25 600.74,402.88 611.13,394.09 621.52,383.75 631.91,373.23 642.30,363.39 652.69,354.34 663.08,345.97 673.48,337.24 683.87,326.48 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,195.11 81.18,194.80 91.57,194.28 101.96,194.00 112.35,193.65 122.74,191.90 133.13,187.71 143.53,182.88 153.92,180.76 164.31,183.32 174.70,187.85 185.09,190.72 195.48,190.60 205.87,189.70 216.26,190.42 226.65,193.98 237.05,200.72 247.44,210.86 257.83,224.79 268.22,242.91 278.61,265.20 289.00,290.88 299.39,319.09 309.78,347.57 320.18,372.95 330.57,392.36 340.96,404.84 351.35,410.18 361.74,409.66 372.13,407.85 382.52,409.43 392.91,415.21 403.30,422.19 413.70,427.45 424.09,430.14 434.48,430.35 444.87,428.30 455.26,424.46 465.65,419.36 476.04,413.57 486.43,407.80 496.83,402.59 507.22,397.57 517.61,391.86 528.00,385.13 538.39,378.68 548.78,374.10 559.17,371.84 569.56,370.80 579.95,369.83 590.35,368.55 600.74,367.04 611.13,365.42 621.52,363.78 631.91,362.16 642.30,360.64 652.69,359.26 663.08,358.03 673.48,356.31 683.87,353.06 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,228.74 81.18,227.41 91.57,223.81 101.96,218.22 112.35,210.93 122.74,202.23 133.13,192.44 143.53,182.44 153.92,173.39 164.31,166.48 174.70,163.51 185.09,166.14 195.48,174.17 205.87,184.69 216.26,194.95 226.65,204.75 237.05,215.61 247.44,228.74 257.83,243.90 268.22,260.39 278.61,277.42 289.00,294.04 299.39,309.38 309.78,323.37 320.18,336.56 330.57,349.39 340.96,361.63 351.35,372.80 361.74,382.61 372.13,391.27 382.52,399.03 392.91,406.30 403.30,413.59 413.70,421.21 424.09,428.19 434.48,433.06 444.87,434.96 455.26,434.67 465.65,433.23 476.04,431.01 486.43,427.60 496.83,422.65 507.22,417.12 517.61,412.63 528.00,410.32 538.39,409.92 548.78,410.83 559.17,412.03 569.56,411.88 579.95,408.95 590.35,403.20 600.74,395.48 611.13,386.53 621.52,376.45 631.91,365.17 642.30,352.87 652.69,340.07 663.08,327.35 673.48,316.12 683.87,308.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,180.94 81.18,177.86 91.57,170.57 101.96,161.08 112.35,152.21 122.74,147.63 133.13,150.13 143.53,157.24 153.92,163.64 164.31,166.09 174.70,168.24 185.09,175.17 195.48,188.26 205.87,203.31 216.26,216.13 226.65,225.72 237.05,233.32 247.44,240.13 257.83,246.59 268.22,252.85 278.61,259.25 289.00,266.60 299.39,275.64 309.78,286.65 320.18,299.53 330.57,314.13 340.96,330.27 351.35,347.77 361.74,365.84 372.13,382.25 382.52,394.80 392.91,403.89 403.30,412.37 413.70,422.63 424.09,433.54 434.48,442.46 444.87,447.45 455.26,448.55 465.65,446.18 476.04,441.17 486.43,434.82 496.83,428.42 507.22,423.43 517.61,421.36 528.00,423.08 538.39,427.67 548.78,433.82 559.17,439.61 569.56,442.29 579.95,439.50 590.35,431.98 600.74,422.38 611.13,412.87 621.52,403.67 631.91,394.45 642.30,384.78 652.69,374.09 663.08,361.91 673.48,349.00 683.87,336.94 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,382.82 81.18,383.31 91.57,381.48 101.96,372.97 112.35,355.87 122.74,331.70 133.13,302.42 143.53,270.56 153.92,238.92 164.31,210.30 174.70,187.98 185.09,174.78 195.48,171.50 205.87,176.21 216.26,186.74 226.65,201.12 237.05,217.69 247.44,235.26 257.83,253.54 268.22,272.54 278.61,291.60 289.00,308.69 299.39,321.87 309.78,331.35 320.18,339.09 330.57,346.81 340.96,354.88 351.35,363.12 361.74,371.58 372.13,380.87 382.52,391.58 392.91,402.85 403.30,412.45 413.70,418.44 424.09,420.78 434.48,420.31 444.87,417.69 455.26,413.16 465.65,406.89 476.04,400.12 486.43,395.28 496.83,394.39 507.22,396.43 517.61,398.79 528.00,399.61 538.39,399.47 548.78,399.46 559.17,399.80 569.56,399.46 579.95,397.47 590.35,394.13 600.74,390.48 611.13,387.28 621.52,384.16 631.91,380.48 642.30,376.36 652.69,373.11 663.08,372.01 673.48,372.80 683.87,374.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,46.53 81.18,49.80 91.57,58.17 101.96,70.30 112.35,85.07 122.74,101.75 133.13,119.82 143.53,138.70 153.92,157.81 164.31,176.41 174.70,192.93 185.09,205.69 195.48,214.18 205.87,219.53 216.26,222.95 226.65,225.25 237.05,226.95 247.44,228.65 257.83,231.83 268.22,238.11 278.61,248.11 289.00,260.84 299.39,275.21 309.78,290.76 320.18,307.62 330.57,325.67 340.96,342.99 351.35,357.09 361.74,366.65 372.13,372.74 382.52,376.75 392.91,379.79 403.30,382.64 413.70,385.99 424.09,390.46 434.48,396.56 444.87,404.18 455.26,411.61 465.65,416.96 476.04,419.86 486.43,421.63 496.83,423.56 507.22,425.98 517.61,428.63 528.00,431.29 538.39,433.81 548.78,436.06 559.17,437.49 569.56,436.96 579.95,433.51 590.35,427.80 600.74,421.47 611.13,415.76 621.52,410.30 631.91,404.30 642.30,397.35 652.69,389.69 663.08,381.63 673.48,373.51 683.87,365.66 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,121.88 81.18,122.13 91.57,124.15 101.96,129.55 112.35,138.55 122.74,149.60 133.13,161.09 143.53,171.10 153.92,177.60 164.31,179.52 174.70,178.51 185.09,176.82 195.48,176.69 205.87,180.50 216.26,190.05 226.65,204.21 237.05,219.96 247.44,234.90 257.83,248.99 268.22,262.91 278.61,277.30 289.00,292.59 299.39,309.10 309.78,326.41 320.18,343.48 330.57,359.26 340.96,372.44 351.35,381.72 361.74,386.92 372.13,390.37 382.52,394.60 392.91,400.63 403.30,407.99 413.70,416.06 424.09,424.13 434.48,431.47 444.87,437.63 455.26,442.92 465.65,447.76 476.04,452.17 486.43,455.66 496.83,457.81 507.22,458.75 517.61,458.89 528.00,458.42 538.39,456.88 548.78,453.69 559.17,448.59 569.56,441.74 579.95,433.33 590.35,423.36 600.74,411.72 611.13,398.36 621.52,383.47 631.91,367.30 642.30,350.64 652.69,335.08 663.08,322.14 673.48,312.28 683.87,305.17 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,272.67 81.18,272.82 91.57,271.98 101.96,268.49 112.35,261.63 122.74,251.96 133.13,240.20 143.53,227.39 153.92,214.72 164.31,203.32 174.70,194.45 185.09,189.23 195.48,187.75 205.87,188.63 216.26,190.57 226.65,194.01 237.05,200.56 247.44,211.37 257.83,225.64 268.22,242.04 278.61,259.45 289.00,277.05 299.39,294.17 309.78,310.78 320.18,327.27 330.57,343.81 340.96,359.03 351.35,371.09 361.74,379.06 372.13,384.02 382.52,387.32 392.91,390.52 403.30,395.35 413.70,403.13 424.09,413.18 434.48,423.92 444.87,433.79 455.26,441.11 465.65,444.36 476.04,444.19 486.43,443.67 496.83,445.64 507.22,450.37 517.61,456.74 528.00,463.38 538.39,468.18 548.78,468.97 559.17,464.63 569.56,455.42 579.95,441.80 590.35,424.66 600.74,405.11 611.13,384.29 621.52,363.23 631.91,342.91 642.30,323.91 652.69,306.32 663.08,290.09 673.48,275.36 683.87,262.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,237.47 81.18,234.12 91.57,225.88 101.96,214.52 112.35,202.55 122.74,193.34 133.13,189.66 143.53,190.91 153.92,194.47 164.31,198.07 174.70,200.46 185.09,200.86 195.48,199.90 205.87,200.26 216.26,204.46 226.65,213.03 237.05,225.11 247.44,239.96 257.83,257.77 268.22,278.98 278.61,302.31 289.00,323.04 299.39,336.66 309.78,343.06 320.18,345.74 330.57,347.86 340.96,350.25 351.35,352.81 361.74,355.98 372.13,361.68 382.52,371.80 392.91,385.71 403.30,400.40 413.70,413.10 424.09,422.76 434.48,429.13 444.87,432.27 455.26,432.86 465.65,431.66 476.04,429.26 486.43,426.02 496.83,422.28 507.22,418.44 517.61,414.92 528.00,411.84 538.39,408.52 548.78,404.14 559.17,398.25 569.56,390.99 579.95,382.55 590.35,373.54 600.74,364.80 611.13,357.06 621.52,350.67 631.91,345.83 642.30,342.69 652.69,341.35 663.08,341.87 673.48,343.71 683.87,345.98 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,118.43 81.18,118.68 91.57,120.72 101.96,126.24 112.35,135.86 122.74,148.92 133.13,164.51 143.53,179.44 153.92,189.47 164.31,192.10 174.70,190.22 185.09,187.90 195.48,187.81 205.87,190.54 216.26,196.20 226.65,203.92 237.05,212.30 247.44,220.48 257.83,229.88 268.22,242.50 278.61,259.04 289.00,277.83 299.39,297.04 309.78,314.59 320.18,328.26 330.57,336.68 340.96,342.43 351.35,349.37 361.74,359.59 372.13,371.24 382.52,381.97 392.91,390.91 403.30,398.64 413.70,405.79 424.09,412.83 434.48,420.07 444.87,427.55 455.26,434.53 465.65,440.13 476.04,443.67 486.43,444.64 496.83,442.71 507.22,438.59 517.61,433.52 528.00,428.64 538.39,424.92 548.78,423.17 559.17,422.88 569.56,421.81 579.95,417.85 590.35,411.20 600.74,403.49 611.13,395.91 621.52,387.91 631.91,378.50 642.30,367.29 652.69,354.78 663.08,341.62 673.48,328.93 683.87,318.11 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,153.86 81.18,153.04 91.57,153.24 101.96,157.78 112.35,166.72 122.74,176.05 133.13,181.99 143.53,183.64 153.92,181.86 164.31,178.17 174.70,176.35 185.09,180.33 195.48,191.11 205.87,205.43 216.26,219.99 226.65,233.61 237.05,246.61 247.44,259.19 257.83,270.34 268.22,278.77 278.61,284.65 289.00,290.84 299.39,300.21 309.78,312.85 320.18,326.62 330.57,339.60 340.96,351.52 351.35,362.70 361.74,373.14 372.13,382.05 382.52,388.59 392.91,392.72 403.30,395.16 413.70,396.74 424.09,398.90 434.48,403.31 444.87,410.48 455.26,418.01 465.65,423.17 476.04,425.35 486.43,426.39 496.83,428.07 507.22,430.37 517.61,432.33 528.00,433.06 538.39,431.82 548.78,427.97 559.17,421.78 569.56,414.70 579.95,408.20 590.35,402.98 600.74,399.23 611.13,396.59 621.52,392.84 631.91,385.39 642.30,373.99 652.69,361.95 663.08,352.68 673.48,346.81 683.87,342.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,300.46 81.18,296.29 91.57,285.86 101.96,271.03 112.35,252.55 122.74,229.49 133.13,201.30 143.53,171.98 153.92,147.96 164.31,134.19 174.70,131.46 185.09,139.04 195.48,154.83 205.87,175.12 216.26,196.74 226.65,218.65 237.05,241.22 247.44,264.34 257.83,284.59 268.22,297.83 278.61,302.90 289.00,303.96 299.39,305.52 309.78,309.56 320.18,315.90 330.57,324.00 340.96,332.41 351.35,339.46 361.74,344.58 372.13,349.63 382.52,356.68 392.91,365.93 403.30,375.76 413.70,384.72 424.09,393.18 434.48,402.26 444.87,412.62 455.26,423.70 465.65,434.71 476.04,444.44 486.43,451.13 496.83,453.35 507.22,451.89 517.61,448.70 528.00,445.27 538.39,441.63 548.78,437.48 559.17,432.28 569.56,425.22 579.95,415.65 590.35,404.43 600.74,393.28 611.13,383.46 621.52,374.37 631.91,364.96 642.30,355.15 652.69,346.47 663.08,340.41 673.48,336.95 683.87,334.96 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,181.17 81.18,175.84 91.57,164.56 101.96,152.48 112.35,142.44 122.74,133.94 133.13,126.30 143.53,121.36 153.92,122.28 164.31,130.89 174.70,145.15 185.09,162.26 195.48,180.17 205.87,197.80 216.26,214.42 226.65,230.11 237.05,245.40 247.44,260.74 257.83,276.11 268.22,291.32 278.61,306.35 289.00,321.48 299.39,336.94 309.78,351.41 320.18,362.35 330.57,367.83 340.96,368.95 351.35,367.94 361.74,366.65 372.13,366.20 382.52,367.47 392.91,370.29 403.30,373.52 413.70,376.16 424.09,378.25 434.48,380.36 444.87,382.92 455.26,386.09 465.65,389.92 476.04,394.53 486.43,400.06 496.83,406.55 507.22,413.32 517.61,419.33 528.00,423.81 538.39,426.77 548.78,428.40 559.17,428.93 569.56,428.63 579.95,427.76 590.35,426.47 600.74,424.85 611.13,422.78 621.52,419.43 631.91,413.82 642.30,405.30 652.69,393.80 663.08,379.39 673.48,363.15 683.87,346.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,82.50 81.18,82.67 91.57,85.64 101.96,94.51 112.35,109.57 122.74,127.67 133.13,145.77 143.53,161.18 153.92,171.56 164.31,175.86 174.70,176.84 185.09,178.01 195.48,181.09 205.87,185.18 216.26,189.24 226.65,194.36 237.05,203.12 247.44,217.11 257.83,234.09 268.22,250.86 278.61,266.19 289.00,282.30 299.39,301.56 309.78,323.18 320.18,343.75 330.57,360.48 340.96,373.67 351.35,384.72 361.74,394.55 372.13,402.87 382.52,409.21 392.91,413.73 403.30,417.15 413.70,420.05 424.09,421.83 434.48,421.38 444.87,418.82 455.26,417.44 465.65,420.85 476.04,428.99 486.43,437.53 496.83,442.45 507.22,443.79 517.61,443.68 528.00,443.72 538.39,443.67 548.78,442.86 559.17,441.19 569.56,439.35 579.95,437.95 590.35,436.30 600.74,432.95 611.13,426.77 621.52,417.90 631.91,406.84 642.30,394.39 652.69,381.77 663.08,370.12 673.48,359.95 683.87,351.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,145.33 81.18,146.04 91.57,149.92 101.96,159.32 112.35,173.08 122.74,185.66 133.13,192.12 143.53,192.40 153.92,189.32 164.31,185.57 174.70,183.30 185.09,184.24 195.48,188.61 205.87,194.52 216.26,200.14 226.65,205.56 237.05,212.25 247.44,221.39 257.83,232.92 268.22,246.40 278.61,260.86 289.00,274.34 299.39,285.12 309.78,294.64 320.18,306.86 330.57,324.85 340.96,347.09 351.35,370.50 361.74,392.56 372.13,411.97 382.52,427.73 392.91,439.48 403.30,447.43 413.70,451.84 424.09,453.20 434.48,452.06 444.87,449.05 455.26,445.06 465.65,440.99 476.04,437.32 486.43,434.07 496.83,431.25 507.22,428.99 517.61,427.53 528.00,426.92 538.39,426.54 548.78,425.68 559.17,423.85 569.56,420.81 579.95,416.35 590.35,409.97 600.74,401.06 611.13,389.33 621.52,375.70 631.91,361.33 642.30,347.06 652.69,333.13 663.08,319.71 673.48,307.17 683.87,296.05 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,220.01 81.18,224.20 91.57,231.92 101.96,237.66 112.35,238.42 122.74,234.65 133.13,227.21 143.53,217.29 153.92,206.17 164.31,195.18 174.70,186.14 185.09,180.77 195.48,179.41 205.87,180.48 216.26,182.44 226.65,186.15 237.05,194.08 247.44,207.95 257.83,226.52 268.22,247.79 278.61,270.07 289.00,292.08 299.39,312.74 309.78,330.86 320.18,345.12 330.57,354.70 340.96,361.13 351.35,366.74 361.74,373.09 372.13,380.26 382.52,387.98 392.91,395.96 403.30,403.82 413.70,411.21 424.09,417.85 434.48,423.48 444.87,428.07 455.26,432.04 465.65,435.91 476.04,439.50 486.43,441.85 496.83,442.14 507.22,440.76 517.61,438.79 528.00,436.95 538.39,434.93 548.78,432.17 559.17,428.53 569.56,424.41 579.95,420.20 590.35,415.86 600.74,411.08 611.13,405.42 621.52,397.91 631.91,387.54 642.30,374.14 652.69,358.77 663.08,342.67 673.48,327.16 683.87,313.59 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,315.42 81.18,314.76 91.57,310.32 101.96,298.68 112.35,279.93 122.74,258.91 133.13,240.31 143.53,224.71 153.92,210.08 164.31,195.37 174.70,184.06 185.09,180.39 195.48,184.96 205.87,192.98 216.26,199.77 226.65,204.92 237.05,210.98 247.44,220.08 257.83,232.23 268.22,246.72 278.61,262.84 289.00,279.88 299.39,297.16 309.78,313.48 320.18,327.23 330.57,337.18 340.96,343.67 351.35,347.59 361.74,350.57 372.13,355.83 382.52,366.46 392.91,381.74 403.30,397.31 413.70,409.29 424.09,417.58 434.48,423.76 444.87,429.02 455.26,433.43 465.65,436.88 476.04,439.21 486.43,440.24 496.83,439.81 507.22,438.18 517.61,435.79 528.00,433.08 538.39,430.52 548.78,428.50 559.17,427.20 569.56,426.47 579.95,426.02 590.35,424.32 600.74,419.14 611.13,408.87 621.52,393.90 631.91,375.27 642.30,354.69 652.69,334.88 663.08,318.43 673.48,306.09 683.87,297.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,162.46 81.18,160.98 91.57,158.32 101.96,156.51 112.35,156.69 122.74,158.78 133.13,162.44 143.53,166.48 153.92,169.30 164.31,170.18 174.70,171.45 185.09,175.97 195.48,184.36 205.87,193.97 216.26,202.17 226.65,209.15 237.05,217.02 247.44,227.38 257.83,239.64 268.22,252.58 278.61,265.73 289.00,280.01 299.39,296.42 309.78,314.46 320.18,332.48 330.57,348.93 340.96,362.77 351.35,373.23 361.74,380.32 372.13,385.80 382.52,391.54 392.91,398.14 403.30,404.93 413.70,411.20 424.09,416.54 434.48,420.73 444.87,423.65 455.26,425.65 465.65,427.09 476.04,428.30 486.43,429.52 496.83,430.85 507.22,431.52 517.61,430.32 528.00,426.68 538.39,421.89 548.78,417.60 559.17,414.19 569.56,410.42 579.95,405.03 590.35,398.06 600.74,390.37 611.13,382.61 621.52,374.67 631.91,366.25 642.30,357.28 652.69,348.11 663.08,339.15 673.48,330.92 683.87,323.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,223.99 81.18,225.68 91.57,228.11 101.96,228.14 112.35,224.64 122.74,219.09 133.13,213.12 143.53,207.23 153.92,201.24 164.31,195.15 174.70,190.08 185.09,187.28 195.48,187.01 205.87,188.05 216.26,189.27 226.65,191.48 237.05,196.86 247.44,206.85 257.83,220.10 268.22,234.52 278.61,248.69 289.00,262.29 299.39,275.26 309.78,287.65 320.18,299.59 330.57,311.23 340.96,322.80 351.35,334.52 361.74,346.53 372.13,358.72 382.52,370.97 392.91,383.49 403.30,396.76 413.70,411.17 424.09,426.23 434.48,441.09 444.87,454.87 455.26,466.51 465.65,475.02 476.04,480.08 486.43,482.15 496.83,481.69 507.22,478.58 517.61,472.43 528.00,463.36 538.39,453.06 548.78,443.52 559.17,435.40 569.56,427.59 579.95,418.96 590.35,409.71 600.74,400.86 611.13,393.26 621.52,387.15 631.91,382.57 642.30,379.13 652.69,375.72 663.08,371.33 673.48,365.81 683.87,359.71 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,61.25 81.18,63.42 91.57,70.95 101.96,85.42 112.35,105.06 122.74,124.13 133.13,137.76 143.53,146.16 153.92,152.41 164.31,158.97 174.70,166.46 185.09,174.87 195.48,183.72 205.87,191.93 216.26,198.59 226.65,205.01 237.05,213.93 247.44,227.35 257.83,244.49 268.22,263.76 278.61,283.30 289.00,300.59 299.39,313.40 309.78,321.88 320.18,328.10 330.57,333.89 340.96,339.48 351.35,344.53 361.74,349.45 372.13,356.54 382.52,368.14 392.91,383.66 403.30,399.79 413.70,413.56 424.09,424.78 434.48,434.46 444.87,443.35 455.26,451.30 465.65,458.02 476.04,463.40 486.43,467.58 496.83,470.66 507.22,472.15 517.61,471.36 528.00,467.95 538.39,462.82 548.78,457.06 559.17,451.11 569.56,444.45 579.95,436.51 590.35,427.06 600.74,416.06 611.13,403.46 621.52,389.00 631.91,372.38 642.30,353.94 652.69,334.96 663.08,316.80 673.48,300.45 683.87,286.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,311.32 81.18,310.07 91.57,304.38 101.96,291.36 112.35,271.22 122.74,248.19 133.13,226.52 143.53,208.04 153.92,192.83 164.31,181.05 174.70,174.00 185.09,173.07 195.48,177.78 205.87,185.05 216.26,191.99 226.65,198.51 237.05,206.42 247.44,217.35 257.83,231.79 268.22,249.88 278.61,271.30 289.00,294.88 299.39,319.48 309.78,343.31 320.18,364.09 330.57,379.97 340.96,390.86 351.35,397.32 361.74,399.73 372.13,398.02 382.52,392.11 392.91,383.22 403.30,373.82 413.70,366.24 424.09,362.14 434.48,362.72 444.87,368.59 455.26,378.98 465.65,392.89 476.04,408.85 486.43,424.86 496.83,439.11 507.22,450.52 517.61,458.41 528.00,462.39 538.39,462.77 548.78,460.00 559.17,454.42 569.56,446.17 579.95,435.46 590.35,423.44 600.74,411.83 611.13,401.78 621.52,392.42 631.91,382.40 642.30,371.04 652.69,358.71 663.08,345.88 673.48,332.54 683.87,318.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,208.79 81.18,206.14 91.57,200.46 101.96,194.26 112.35,189.48 122.74,187.25 133.13,188.29 143.53,191.75 153.92,195.94 164.31,199.45 174.70,201.68 185.09,202.32 195.48,201.67 205.87,200.83 216.26,200.91 226.65,202.61 237.05,206.35 247.44,212.57 257.83,222.25 268.22,236.41 278.61,255.03 289.00,276.16 299.39,297.81 309.78,318.07 320.18,335.11 330.57,347.69 340.96,357.07 351.35,365.35 361.74,373.98 372.13,383.13 382.52,392.67 392.91,402.01 403.30,410.16 413.70,416.24 424.09,420.17 434.48,422.24 444.87,423.00 455.26,423.65 465.65,425.43 476.04,428.22 486.43,430.33 496.83,430.22 507.22,428.02 517.61,424.77 528.00,421.27 538.39,417.54 548.78,413.40 559.17,408.74 569.56,403.52 579.95,397.71 590.35,391.49 600.74,385.13 611.13,379.10 621.52,374.56 631.91,372.75 642.30,373.92 652.69,376.70 663.08,379.68 673.48,382.29 683.87,384.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,131.82 81.18,134.15 91.57,139.10 101.96,144.43 112.35,148.32 122.74,149.48 133.13,147.07 143.53,141.63 153.92,134.56 164.31,127.45 174.70,123.09 185.09,124.13 195.48,131.10 205.87,141.56 216.26,153.18 226.65,166.48 237.05,183.92 247.44,207.15 257.83,234.46 268.22,263.31 278.61,291.48 289.00,317.07 299.39,338.47 309.78,355.29 320.18,368.13 330.57,377.59 340.96,384.31 351.35,388.89 361.74,391.91 372.13,393.96 382.52,395.62 392.91,397.37 403.30,399.63 413.70,402.74 424.09,406.60 434.48,410.92 444.87,415.46 455.26,420.15 465.65,424.93 476.04,429.23 486.43,431.86 496.83,431.80 507.22,429.08 517.61,424.31 528.00,418.18 538.39,411.63 548.78,405.54 559.17,400.71 569.56,397.78 579.95,397.19 590.35,398.31 600.74,399.89 611.13,400.55 621.52,398.29 631.91,391.13 642.30,378.78 652.69,363.67 663.08,348.35 673.48,334.10 683.87,321.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,139.51 81.18,141.72 91.57,146.59 101.96,152.21 112.35,157.19 122.74,160.79 133.13,162.65 143.53,163.93 153.92,166.59 164.31,171.79 174.70,178.13 185.09,183.67 195.48,187.33 205.87,189.38 216.26,190.33 226.65,191.64 237.05,195.32 247.44,203.12 257.83,216.28 268.22,235.72 278.61,260.91 289.00,288.73 299.39,316.14 309.78,341.49 320.18,364.27 330.57,384.06 340.96,399.97 351.35,411.04 361.74,417.17 372.13,420.24 382.52,422.29 392.91,424.02 403.30,424.84 413.70,424.24 424.09,423.14 434.48,423.04 444.87,425.02 455.26,429.15 465.65,435.26 476.04,442.26 486.43,448.08 496.83,450.87 507.22,450.72 517.61,448.72 528.00,445.75 538.39,441.82 548.78,436.75 559.17,430.30 569.56,422.08 579.95,411.77 590.35,399.92 600.74,387.56 611.13,375.59 621.52,364.36 631.91,354.03 642.30,344.28 652.69,334.07 663.08,322.38 673.48,308.76 683.87,293.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,133.63 81.18,134.34 91.57,134.99 101.96,133.88 112.35,131.14 122.74,129.38 133.13,130.90 143.53,135.51 153.92,141.53 164.31,147.69 174.70,153.95 185.09,160.63 195.48,168.10 205.87,176.81 216.26,187.11 226.65,199.47 237.05,214.36 247.44,231.95 257.83,251.24 268.22,270.93 278.61,290.34 289.00,309.76 299.39,329.50 309.78,348.32 320.18,363.66 330.57,373.39 340.96,377.40 351.35,376.33 361.74,371.67 372.13,366.75 382.52,364.89 392.91,367.02 403.30,371.67 413.70,377.39 424.09,383.77 434.48,390.88 444.87,398.92 455.26,408.50 465.65,420.21 476.04,433.02 486.43,444.11 496.83,450.95 507.22,453.77 517.61,454.23 528.00,453.74 538.39,452.96 548.78,452.32 559.17,451.64 569.56,449.98 579.95,446.34 590.35,439.61 600.74,428.66 611.13,412.92 621.52,393.83 631.91,373.34 642.30,353.10 652.69,334.26 663.08,317.77 673.48,303.71 683.87,291.54 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,254.84 81.18,257.07 91.57,259.48 101.96,256.88 112.35,247.40 122.74,233.62 133.13,218.47 143.53,204.55 153.92,194.05 164.31,188.32 174.70,186.61 185.09,187.61 195.48,190.72 205.87,196.49 216.26,205.53 226.65,217.73 237.05,232.54 247.44,249.25 257.83,266.31 268.22,282.05 278.61,296.06 289.00,310.21 299.39,326.36 309.78,343.83 320.18,359.81 330.57,372.06 340.96,381.39 351.35,389.71 361.74,398.11 372.13,405.88 382.52,412.08 392.91,416.30 403.30,418.68 413.70,419.46 424.09,419.40 434.48,419.47 444.87,420.26 455.26,421.48 465.65,422.66 476.04,423.58 486.43,424.26 496.83,424.78 507.22,425.11 517.61,425.20 528.00,425.09 538.39,425.17 548.78,425.85 559.17,426.85 569.56,426.90 579.95,424.79 590.35,420.11 600.74,412.91 611.13,403.37 621.52,391.88 631.91,378.92 642.30,365.10 652.69,351.21 663.08,337.97 673.48,325.29 683.87,312.54 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,195.52 81.18,194.53 91.57,193.95 101.96,196.69 112.35,203.10 122.74,210.17 133.13,215.09 143.53,217.81 153.92,219.96 164.31,222.59 174.70,224.47 185.09,223.89 195.48,220.92 205.87,218.42 216.26,219.18 226.65,223.83 237.05,231.43 247.44,241.13 257.83,252.64 268.22,265.89 278.61,280.26 289.00,294.08 299.39,305.77 309.78,315.46 320.18,324.69 330.57,334.76 340.96,345.63 351.35,356.76 361.74,367.27 372.13,375.66 382.52,380.43 392.91,381.83 403.30,381.68 413.70,381.77 424.09,383.15 434.48,386.47 444.87,392.18 455.26,400.33 465.65,410.82 476.04,422.42 486.43,432.62 496.83,439.13 507.22,441.21 517.61,438.98 528.00,433.02 538.39,425.16 548.78,417.49 559.17,411.41 569.56,407.37 579.95,405.65 590.35,405.80 600.74,407.01 611.13,408.37 621.52,408.59 631.91,406.36 642.30,401.23 652.69,394.00 663.08,385.60 673.48,376.74 683.87,367.91 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,126.09 81.18,127.79 91.57,132.48 101.96,139.90 112.35,149.29 122.74,159.34 133.13,168.81 143.53,176.03 153.92,179.19 164.31,177.61 174.70,174.33 185.09,173.04 195.48,175.87 205.87,182.60 216.26,192.66 226.65,205.38 237.05,220.08 247.44,236.05 257.83,251.92 268.22,266.27 278.61,278.48 289.00,289.26 299.39,299.42 309.78,309.16 320.18,318.15 330.57,326.12 340.96,333.21 351.35,339.74 361.74,345.71 372.13,350.48 382.52,353.45 392.91,356.23 403.30,362.60 413.70,375.58 424.09,393.63 434.48,413.29 444.87,431.63 455.26,447.06 465.65,458.35 476.04,465.41 486.43,469.36 496.83,471.24 507.22,470.79 517.61,467.10 528.00,459.74 538.39,449.91 548.78,439.13 559.17,428.56 569.56,418.93 579.95,410.84 590.35,404.40 600.74,399.45 611.13,395.53 621.52,391.14 631.91,384.64 642.30,375.49 652.69,364.95 663.08,354.42 673.48,344.88 683.87,336.99 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,72.57 81.18,76.64 91.57,85.76 101.96,96.73 112.35,107.99 122.74,120.16 133.13,133.98 143.53,148.83 153.92,163.37 164.31,176.45 174.70,187.26 185.09,195.14 195.48,199.72 205.87,200.95 216.26,199.02 226.65,196.38 237.05,196.90 247.44,203.50 257.83,215.86 268.22,232.72 278.61,252.83 289.00,275.17 299.39,298.89 309.78,323.22 320.18,347.49 330.57,370.97 340.96,392.11 351.35,409.14 361.74,421.12 372.13,428.90 382.52,433.54 392.91,435.81 403.30,436.14 413.70,434.93 424.09,432.79 434.48,430.37 444.87,428.22 455.26,426.82 465.65,426.50 476.04,427.01 486.43,427.32 496.83,426.51 507.22,424.55 517.61,421.86 528.00,418.73 538.39,414.83 548.78,409.74 559.17,403.54 569.56,396.99 579.95,390.83 590.35,385.18 600.74,379.74 611.13,374.25 621.52,368.46 631.91,362.14 642.30,355.57 652.69,349.80 663.08,345.82 673.48,343.58 683.87,342.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,173.67 81.18,176.46 91.57,182.05 101.96,187.33 112.35,190.35 122.74,190.74 133.13,188.50 143.53,185.00 153.92,182.34 164.31,182.19 174.70,185.17 185.09,191.50 195.48,200.07 205.87,207.80 216.26,211.96 226.65,213.26 237.05,214.71 247.44,218.99 257.83,227.34 268.22,240.43 278.61,258.03 289.00,278.44 299.39,299.96 309.78,321.12 320.18,340.68 330.57,357.61 340.96,371.24 351.35,381.10 361.74,387.28 372.13,391.17 382.52,394.23 392.91,397.27 403.30,400.39 413.70,403.66 424.09,407.21 434.48,411.21 444.87,415.91 455.26,421.78 465.65,429.30 476.04,438.05 486.43,446.66 496.83,453.78 507.22,458.48 517.61,460.06 528.00,458.25 538.39,453.86 548.78,447.96 559.17,441.10 569.56,433.21 579.95,424.12 590.35,413.54 600.74,401.13 611.13,386.63 621.52,370.06 631.91,351.50 642.30,331.60 652.69,311.84 663.08,293.71 673.48,278.55 683.87,267.51 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,243.03 81.18,242.00 91.57,237.93 101.96,229.34 112.35,217.01 122.74,204.63 133.13,195.71 143.53,191.25 153.92,190.69 164.31,193.02 174.70,196.20 185.09,198.16 195.48,198.30 205.87,198.20 216.26,199.55 226.65,203.44 237.05,210.52 247.44,221.06 257.83,234.36 268.22,249.44 278.61,265.84 289.00,283.98 299.39,304.27 309.78,325.81 320.18,346.56 330.57,364.69 340.96,378.92 351.35,388.29 361.74,392.88 372.13,395.11 382.52,397.57 392.91,400.80 403.30,403.34 413.70,404.01 424.09,404.06 434.48,405.74 444.87,410.32 455.26,416.46 465.65,422.42 476.04,427.13 486.43,430.37 496.83,432.08 507.22,432.37 517.61,431.51 528.00,429.82 538.39,427.82 548.78,426.02 559.17,424.26 569.56,421.45 579.95,416.58 590.35,409.56 600.74,400.88 611.13,391.16 621.52,381.33 631.91,372.36 642.30,364.57 652.69,357.26 663.08,349.71 673.48,342.05 683.87,334.97 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='70.79,170.55 81.18,172.29 91.57,175.26 101.96,176.86 112.35,176.23 122.74,174.83 133.13,174.06 143.53,173.29 153.92,170.75 164.31,165.45 174.70,159.29 185.09,154.73 195.48,153.60 205.87,156.85 216.26,165.00 226.65,176.81 237.05,190.02 247.44,203.20 257.83,218.26 268.22,237.95 278.61,263.05 289.00,290.79 299.39,318.25 309.78,343.29 320.18,364.47 330.57,380.69 340.96,392.20 351.35,399.70 361.74,404.01 372.13,406.29 382.52,407.67 392.91,408.99 403.30,410.82 413.70,413.57 424.09,417.13 434.48,421.13 444.87,425.10 455.26,428.32 465.65,430.08 476.04,430.02 486.43,428.16 496.83,424.71 507.22,420.80 517.61,418.03 528.00,417.24 538.39,417.04 548.78,415.66 559.17,412.68 569.56,409.60 579.95,407.81 590.35,406.53 600.74,403.69 611.13,397.83 621.52,389.84 631.91,381.18 642.30,372.76 652.69,364.67 663.08,356.88 673.48,349.61 683.87,343.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> <rect x='40.13' y='22.78' width='674.39' height='522.33' style='stroke-width: 1.07; stroke: #333333;' /> </g> <g clip-path='url(#cpMC4wMHw3MjAuMDB8MC4wMHw1NzYuMDA=)'> -<text x='35.20' y='423.56' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>0.90</text> -<text x='35.20' y='305.24' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>0.95</text> -<text x='35.20' y='192.98' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>1.00</text> -<text x='35.20' y='86.21' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>1.05</text> -<polyline points='37.39,420.53 40.13,420.53 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='37.39,302.21 40.13,302.21 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='37.39,189.96 40.13,189.96 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='37.39,83.18 40.13,83.18 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='43.06,547.85 43.06,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='323.41,547.85 323.41,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<polyline points='606.85,547.85 606.85,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> -<text x='43.06' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='13.70px' lengthAdjust='spacingAndGlyphs'>Apr</text> -<text x='323.41' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='11.25px' lengthAdjust='spacingAndGlyphs'>Jul</text> -<text x='606.85' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='13.70px' lengthAdjust='spacingAndGlyphs'>Oct</text> +<text x='35.20' y='435.15' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>0.74</text> +<text x='35.20' y='365.42' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>1.00</text> +<text x='35.20' y='207.90' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>2.00</text> +<text x='35.20' y='138.17' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='17.13px' lengthAdjust='spacingAndGlyphs'>2.72</text> +<polyline points='37.39,432.12 40.13,432.12 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='37.39,362.39 40.13,362.39 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='37.39,204.87 40.13,204.87 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='37.39,135.14 40.13,135.14 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='122.74,547.85 122.74,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='268.22,547.85 268.22,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='413.70,547.85 413.70,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='590.35,547.85 590.35,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<text x='122.74' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.40px' lengthAdjust='spacingAndGlyphs'>Feb 15</text> +<text x='268.22' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 01</text> +<text x='413.70' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 15</text> +<text x='590.35' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='25.93px' lengthAdjust='spacingAndGlyphs'>Apr 01</text> <text x='377.33' y='568.24' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='75.23px' lengthAdjust='spacingAndGlyphs'>Reference date</text> <text transform='translate(13.05,283.95) rotate(-90)' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='11.00px' lengthAdjust='spacingAndGlyphs'>Rt</text> <text x='40.13' y='14.56' style='font-size: 13.20px; font-family: sans;' textLength='13.20px' lengthAdjust='spacingAndGlyphs'>Rt</text> diff --git a/tests/testthat/_snaps/predict.md b/tests/testthat/_snaps/predict.md index 91cf0c5..20046d6 100644 --- a/tests/testthat/_snaps/predict.md +++ b/tests/testthat/_snaps/predict.md @@ -20,3 +20,37 @@ ! Swapping `min_date` and `max_date` > `min_date` 2023-01-02 is after `max_date` 2023-01-01 +# Day of week throws correctly formatted errors + + Code + extract_dow_for_predict(object = object, day_of_week = c("Holiday", "New level"), + desired_dates = as.Date(c("2023-01-02", "2023-01-03"))) + Condition + Error in `extract_dow_for_predict()`: + ! `day_of_week` provided unknown level + ! Known levels: Sun, Mon, and Holiday + x Provided but unknown: "New level" + +--- + + Code + extract_dow_for_predict(object = object, day_of_week = "Holiday", + desired_dates = as.Date(c("2023-01-02", "2023-01-03"))) + Condition + Error in `extract_dow_for_predict()`: + ! `day_of_week` was provided a vector of the wrong length + > Provide 2 values, for 2023-01-02 to 2023-01-03 + x Was provided 1 values instead + +--- + + Code + extract_dow_for_predict(object = object, day_of_week = TRUE, desired_dates = as.Date( + c("2023-01-04", "2023-01-05"))) + Condition + Error in `extract_dow_for_predict()`: + ! `day_of_week` required when using custom levels and new dates + x 2023-01-04 and 2023-01-05 weren't in the call to `RtGam()` + i Pass `predict()` `day_of_week` a vector of values to use + > Provide 2 values, for 2023-01-04 to 2023-01-05 + diff --git a/tests/testthat/_snaps/predict/day-of-week-off.svg b/tests/testthat/_snaps/predict/day-of-week-off.svg new file mode 100644 index 0000000..45e8bd5 --- /dev/null +++ b/tests/testthat/_snaps/predict/day-of-week-off.svg @@ -0,0 +1,233 @@ +<?xml version='1.0' encoding='UTF-8' ?> +<svg xmlns='http://www.w3.org/2000/svg' xmlns:xlink='http://www.w3.org/1999/xlink' class='svglite' data-engine-version='2.0' width='720.00pt' height='576.00pt' viewBox='0 0 720.00 576.00'> +<defs> + <style type='text/css'><![CDATA[ + .svglite line, .svglite polyline, .svglite polygon, .svglite path, .svglite rect, .svglite circle { + fill: none; + stroke: #000000; + stroke-linecap: round; + stroke-linejoin: round; + stroke-miterlimit: 10.00; + } + ]]></style> +</defs> +<rect width='100%' height='100%' style='stroke: none; fill: #FFFFFF;'/> +<defs> + <clipPath id='cpMC4wMHw3MjAuMDB8MC4wMHw1NzYuMDA='> + <rect x='0.00' y='0.00' width='720.00' height='576.00' /> + </clipPath> +</defs> +<g clip-path='url(#cpMC4wMHw3MjAuMDB8MC4wMHw1NzYuMDA=)'> +<rect x='0.00' y='0.00' width='720.00' height='576.00' style='stroke-width: 1.07; stroke: #FFFFFF; fill: #FFFFFF;' /> +</g> +<defs> + <clipPath id='cpNDcuNDh8NzE0LjUyfDIyLjc4fDU0NS4xMQ=='> + <rect x='47.48' y='22.78' width='667.04' height='522.33' /> + </clipPath> +</defs> +<g clip-path='url(#cpNDcuNDh8NzE0LjUyfDIyLjc4fDU0NS4xMQ==)'> +<rect x='47.48' y='22.78' width='667.04' height='522.33' style='stroke-width: 1.07; stroke: none; fill: #FFFFFF;' /> +<polyline points='47.48,469.64 714.52,469.64 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,343.68 714.52,343.68 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,217.71 714.52,217.71 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,91.75 714.52,91.75 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='57.24,545.11 57.24,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='201.13,545.11 201.13,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='345.03,545.11 345.03,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='504.34,545.11 504.34,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='663.64,545.11 663.64,22.78 ' style='stroke-width: 0.53; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,532.62 714.52,532.62 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,406.66 714.52,406.66 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,280.69 714.52,280.69 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,154.73 714.52,154.73 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='47.48,28.76 714.52,28.76 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='129.19,545.11 129.19,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='273.08,545.11 273.08,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='416.97,545.11 416.97,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<polyline points='591.70,545.11 591.70,22.78 ' style='stroke-width: 1.07; stroke: #EBEBEB; stroke-linecap: butt;' /> +<circle cx='77.80' cy='511.04' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='88.08' cy='505.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='98.35' cy='487.32' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='108.63' cy='469.85' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='118.91' cy='478.16' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='129.19' cy='455.32' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='139.47' cy='482.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='149.74' cy='475.65' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='160.02' cy='478.92' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='170.30' cy='347.62' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='180.58' cy='370.34' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='190.86' cy='412.37' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='201.13' cy='397.71' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='211.41' cy='394.78' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='221.69' cy='408.34' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='231.97' cy='396.46' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='242.25' cy='239.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='252.52' cy='378.86' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='262.80' cy='202.60' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='273.08' cy='304.17' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='283.36' cy='322.93' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='293.64' cy='344.39' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='303.91' cy='417.87' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='314.19' cy='241.98' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='324.47' cy='275.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='334.75' cy='319.70' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='345.03' cy='407.20' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='355.30' cy='453.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='365.58' cy='391.25' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='375.86' cy='408.34' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='386.14' cy='138.61' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='396.42' cy='290.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='406.69' cy='318.48' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='416.97' cy='363.66' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='427.25' cy='448.23' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='437.53' cy='448.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='447.81' cy='454.27' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='458.08' cy='347.96' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='468.36' cy='296.52' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='478.64' cy='352.20' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='488.92' cy='443.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='499.20' cy='487.32' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='509.47' cy='441.05' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='519.75' cy='480.47' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='530.03' cy='342.58' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='540.31' cy='356.78' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='550.59' cy='388.73' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='560.86' cy='438.28' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='571.14' cy='427.27' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='581.42' cy='473.00' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='591.70' cy='516.08' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='601.98' cy='410.10' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='612.25' cy='435.21' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='622.53' cy='449.15' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='632.81' cy='417.28' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='643.09' cy='456.67' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='653.37' cy='469.30' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='663.64' cy='475.77' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='673.92' cy='322.89' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<circle cx='684.20' cy='349.55' r='1.95' style='stroke-width: 0.71; fill: #000000;' /> +<polyline points='77.80,499.70 88.08,501.51 98.35,464.69 108.63,490.93 118.91,489.50 129.19,470.14 139.47,508.06 149.74,435.42 160.02,416.82 170.30,478.75 180.58,442.64 190.86,456.08 201.13,292.24 211.41,304.54 221.69,351.61 231.97,352.79 242.25,417.95 252.52,386.71 262.80,289.55 273.08,361.56 283.36,374.33 293.64,366.94 303.91,405.44 314.19,336.58 324.47,469.05 334.75,364.59 345.03,427.11 355.30,367.23 365.58,424.84 375.86,419.25 386.14,394.48 396.42,368.74 406.69,409.26 416.97,367.90 427.25,438.40 437.53,389.99 447.81,360.64 458.08,421.73 468.36,435.08 478.64,443.61 488.92,444.57 499.20,428.20 509.47,473.92 519.75,456.75 530.03,468.00 540.31,430.68 550.59,458.68 560.86,446.51 571.14,457.38 581.42,445.25 591.70,464.06 601.98,476.36 612.25,460.49 622.53,451.38 632.81,448.56 643.09,439.24 653.37,458.72 663.64,491.39 673.92,432.69 684.20,437.94 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.55 88.08,502.94 98.35,507.68 108.63,502.85 118.91,495.67 129.19,484.92 139.47,483.33 149.74,484.42 160.02,421.77 170.30,417.32 180.58,387.76 190.86,420.22 201.13,399.56 211.41,381.63 221.69,415.18 231.97,380.84 242.25,360.60 252.52,374.12 262.80,302.19 273.08,303.96 283.36,370.30 293.64,415.81 303.91,275.28 314.19,340.32 324.47,299.00 334.75,286.07 345.03,286.57 355.30,329.90 365.58,249.08 375.86,337.76 386.14,471.36 396.42,389.53 406.69,414.80 416.97,425.43 427.25,366.85 437.53,395.62 447.81,406.41 458.08,415.22 468.36,382.68 478.64,398.97 488.92,443.82 499.20,455.57 509.47,408.80 519.75,426.64 530.03,459.31 540.31,428.83 550.59,454.73 560.86,432.48 571.14,444.74 581.42,459.94 591.70,448.73 601.98,431.26 612.25,457.25 622.53,478.88 632.81,457.84 643.09,431.73 653.37,458.30 663.64,449.19 673.92,423.66 684.20,464.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,492.23 88.08,520.99 98.35,490.42 108.63,480.47 118.91,493.28 129.19,478.71 139.47,471.03 149.74,476.27 160.02,473.21 170.30,458.22 180.58,488.49 190.86,412.66 201.13,444.74 211.41,382.14 221.69,367.27 231.97,438.44 242.25,333.64 252.52,367.06 262.80,269.78 273.08,259.62 283.36,456.46 293.64,362.11 303.91,295.43 314.19,322.64 324.47,322.22 334.75,204.44 345.03,335.24 355.30,328.98 365.58,432.99 375.86,349.34 386.14,417.41 396.42,352.62 406.69,415.69 416.97,340.86 427.25,435.97 437.53,327.13 447.81,388.90 458.08,424.42 468.36,444.07 478.64,427.57 488.92,470.23 499.20,405.65 509.47,443.44 519.75,399.31 530.03,435.34 540.31,471.82 550.59,436.30 560.86,473.13 571.14,464.06 581.42,473.00 591.70,461.12 601.98,438.99 612.25,429.58 622.53,481.90 632.81,385.54 643.09,423.16 653.37,433.66 663.64,437.31 673.92,401.16 684.20,326.67 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,487.32 88.08,495.72 98.35,491.94 108.63,475.02 118.91,487.23 129.19,469.93 139.47,439.20 149.74,436.81 160.02,394.36 170.30,377.81 180.58,410.65 190.86,424.76 201.13,394.23 211.41,384.66 221.69,365.85 231.97,363.75 242.25,355.81 252.52,268.35 262.80,363.54 273.08,391.25 283.36,182.90 293.64,132.94 303.91,383.98 314.19,335.11 324.47,335.28 334.75,380.29 345.03,420.81 355.30,370.09 365.58,367.86 375.86,394.36 386.14,390.12 396.42,457.00 406.69,414.51 416.97,315.12 427.25,346.95 437.53,399.18 447.81,429.71 458.08,331.21 468.36,432.02 478.64,423.58 488.92,421.86 499.20,370.88 509.47,459.56 519.75,470.52 530.03,444.28 540.31,470.65 550.59,467.79 560.86,436.47 571.14,448.39 581.42,457.97 591.70,453.18 601.98,466.49 612.25,478.84 622.53,460.78 632.81,468.84 643.09,435.63 653.37,431.43 663.64,405.73 673.92,425.26 684.20,477.95 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,485.26 88.08,511.08 98.35,476.40 108.63,504.99 118.91,506.88 129.19,473.04 139.47,473.92 149.74,436.05 160.02,460.11 170.30,446.93 180.58,423.92 190.86,453.56 201.13,404.10 211.41,424.80 221.69,399.98 231.97,338.76 242.25,399.44 252.52,377.60 262.80,387.01 273.08,370.00 283.36,345.90 293.64,310.13 303.91,260.92 314.19,423.58 324.47,435.42 334.75,393.39 345.03,398.64 355.30,290.10 365.58,462.38 375.86,379.32 386.14,402.88 396.42,437.27 406.69,363.75 416.97,382.52 427.25,412.28 437.53,477.95 447.81,388.52 458.08,413.17 468.36,413.00 478.64,371.18 488.92,407.62 499.20,413.21 509.47,444.20 519.75,457.88 530.03,430.26 540.31,473.88 550.59,451.80 560.86,457.13 571.14,392.89 581.42,475.44 591.70,454.94 601.98,449.32 612.25,444.36 622.53,474.55 632.81,460.53 643.09,404.94 653.37,483.50 663.64,420.39 673.92,459.23 684.20,374.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,478.92 88.08,491.18 98.35,476.99 108.63,460.53 118.91,453.56 129.19,433.82 139.47,465.06 149.74,438.36 160.02,418.96 170.30,453.35 180.58,457.93 190.86,411.87 201.13,420.60 211.41,337.08 221.69,321.00 231.97,391.63 242.25,269.57 252.52,309.58 262.80,383.44 273.08,292.87 283.36,261.80 293.64,421.94 303.91,377.81 314.19,286.19 324.47,328.39 334.75,300.26 345.03,304.88 355.30,442.01 365.58,334.56 375.86,322.14 386.14,332.26 396.42,351.61 406.69,395.83 416.97,457.88 427.25,356.06 437.53,411.19 447.81,370.00 458.08,376.76 468.36,417.03 478.64,438.19 488.92,403.68 499.20,407.96 509.47,416.86 519.75,441.21 530.03,442.52 540.31,480.73 550.59,423.87 560.86,452.64 571.14,414.55 581.42,477.95 591.70,411.11 601.98,410.35 612.25,455.28 622.53,454.99 632.81,421.56 643.09,441.80 653.37,429.16 663.64,447.05 673.92,450.28 684.20,417.53 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,504.99 88.08,505.83 98.35,488.54 108.63,479.93 118.91,481.52 129.19,493.03 139.47,428.11 149.74,427.57 160.02,400.91 170.30,371.56 180.58,449.49 190.86,349.55 201.13,379.79 211.41,356.40 221.69,391.08 231.97,356.36 242.25,251.64 252.52,403.72 262.80,241.98 273.08,328.35 283.36,388.86 293.64,360.30 303.91,349.81 314.19,361.90 324.47,413.50 334.75,387.43 345.03,396.37 355.30,338.68 365.58,322.39 375.86,407.25 386.14,375.76 396.42,423.62 406.69,286.87 416.97,350.06 427.25,353.63 437.53,372.44 447.81,387.89 458.08,397.51 468.36,422.07 478.64,446.55 488.92,432.06 499.20,357.03 509.47,411.95 519.75,382.22 530.03,466.53 540.31,439.28 550.59,447.93 560.86,468.34 571.14,474.01 581.42,406.03 591.70,440.92 601.98,459.94 612.25,469.68 622.53,403.13 632.81,460.74 643.09,474.05 653.37,431.01 663.64,330.11 673.92,461.66 684.20,412.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.37 88.08,515.58 98.35,489.17 108.63,488.49 118.91,501.01 129.19,499.07 139.47,497.10 149.74,484.13 160.02,484.46 170.30,498.15 180.58,447.35 190.86,380.54 201.13,357.57 211.41,399.94 221.69,315.33 231.97,242.99 242.25,309.25 252.52,221.45 262.80,230.01 273.08,391.08 283.36,281.91 293.64,287.08 303.91,301.23 314.19,369.62 324.47,308.87 334.75,309.29 345.03,355.39 355.30,325.41 365.58,407.16 375.86,346.49 386.14,448.86 396.42,304.38 406.69,357.83 416.97,411.99 427.25,379.07 437.53,421.27 447.81,460.95 458.08,415.14 468.36,437.27 478.64,436.09 488.92,392.76 499.20,407.16 509.47,389.28 519.75,444.49 530.03,469.72 540.31,410.90 550.59,420.22 560.86,450.07 571.14,448.52 581.42,492.02 591.70,485.39 601.98,459.73 612.25,458.51 622.53,484.34 632.81,465.86 643.09,468.68 653.37,418.63 663.64,436.64 673.92,402.50 684.20,416.86 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.58 88.08,501.59 98.35,480.73 108.63,508.73 118.91,462.25 129.19,490.63 139.47,493.83 149.74,495.59 160.02,461.62 170.30,456.62 180.58,440.67 190.86,421.48 201.13,440.08 211.41,451.04 221.69,342.79 231.97,355.77 242.25,269.82 252.52,335.07 262.80,314.28 273.08,363.75 283.36,273.26 293.64,257.56 303.91,443.57 314.19,387.60 324.47,398.81 334.75,346.87 345.03,393.89 355.30,340.44 365.58,401.54 375.86,417.07 386.14,383.31 396.42,384.03 406.69,430.84 416.97,475.98 427.25,465.86 437.53,442.05 447.81,445.96 458.08,448.06 468.36,496.93 478.64,391.79 488.92,438.19 499.20,423.92 509.47,451.96 519.75,460.19 530.03,469.09 540.31,463.85 550.59,473.88 560.86,488.87 571.14,480.47 581.42,477.62 591.70,474.68 601.98,444.28 612.25,476.11 622.53,457.42 632.81,453.14 643.09,482.07 653.37,480.56 663.64,457.93 673.92,504.20 684.20,330.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,481.65 88.08,478.75 98.35,486.56 108.63,455.87 118.91,473.08 129.19,456.16 139.47,477.45 149.74,443.86 160.02,403.47 170.30,422.28 180.58,441.55 190.86,413.00 201.13,396.37 211.41,293.08 221.69,284.05 231.97,307.94 242.25,320.04 252.52,354.30 262.80,382.43 273.08,322.47 283.36,252.02 293.64,262.35 303.91,360.51 314.19,200.58 324.47,269.65 334.75,373.40 345.03,300.22 355.30,272.34 365.58,384.15 375.86,301.48 386.14,381.76 396.42,310.84 406.69,348.67 416.97,369.12 427.25,285.90 437.53,331.96 447.81,439.79 458.08,428.87 468.36,424.17 478.64,402.50 488.92,408.21 499.20,400.78 509.47,466.49 519.75,435.17 530.03,430.09 540.31,441.93 550.59,428.91 560.86,429.46 571.14,450.41 581.42,464.64 591.70,458.68 601.98,342.33 612.25,425.09 622.53,393.18 632.81,452.17 643.09,471.40 653.37,410.35 663.64,419.25 673.92,385.50 684.20,442.56 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,498.02 88.08,502.94 98.35,492.61 108.63,484.92 118.91,462.25 129.19,459.61 139.47,439.45 149.74,465.90 160.02,478.50 170.30,421.40 180.58,474.81 190.86,392.72 201.13,400.11 211.41,339.86 221.69,406.57 231.97,405.61 242.25,379.79 252.52,385.87 262.80,334.06 273.08,318.32 283.36,233.96 293.64,307.19 303.91,330.28 314.19,362.57 324.47,286.28 334.75,341.11 345.03,242.40 355.30,453.73 365.58,372.56 375.86,345.19 386.14,366.31 396.42,414.64 406.69,402.12 416.97,331.25 427.25,414.55 437.53,382.10 447.81,404.43 458.08,361.52 468.36,374.58 478.64,449.70 488.92,398.09 499.20,449.65 509.47,413.04 519.75,446.76 530.03,408.76 540.31,433.78 550.59,443.44 560.86,431.14 571.14,431.64 581.42,433.24 591.70,473.29 601.98,436.55 612.25,439.24 622.53,441.76 632.81,433.57 643.09,468.42 653.37,413.04 663.64,433.24 673.92,433.36 684.20,408.67 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,500.54 88.08,495.59 98.35,467.33 108.63,488.41 118.91,470.98 129.19,441.93 139.47,447.09 149.74,481.61 160.02,440.50 170.30,446.76 180.58,475.27 190.86,457.72 201.13,423.12 211.41,393.64 221.69,363.07 231.97,395.95 242.25,380.71 252.52,414.17 262.80,408.38 273.08,380.42 283.36,346.24 293.64,315.29 303.91,392.63 314.19,396.12 324.47,436.81 334.75,355.52 345.03,402.38 355.30,436.09 365.58,384.07 375.86,384.19 386.14,399.39 396.42,356.69 406.69,456.58 416.97,423.71 427.25,404.85 437.53,401.91 447.81,422.24 458.08,374.12 468.36,418.96 478.64,476.74 488.92,382.01 499.20,406.15 509.47,430.42 519.75,437.69 530.03,430.55 540.31,437.14 550.59,437.14 560.86,436.34 571.14,430.30 581.42,483.96 591.70,480.14 601.98,455.49 612.25,405.27 622.53,466.32 632.81,412.49 643.09,421.19 653.37,422.61 663.64,438.07 673.92,431.35 684.20,386.76 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.54 88.08,501.05 98.35,500.46 108.63,473.17 118.91,493.24 129.19,485.60 139.47,407.96 149.74,461.96 160.02,478.67 170.30,445.46 180.58,457.88 190.86,414.47 201.13,413.75 211.41,352.96 221.69,357.03 231.97,428.83 242.25,337.59 252.52,296.69 262.80,233.92 273.08,386.42 283.36,241.43 293.64,345.65 303.91,317.69 314.19,279.39 324.47,305.47 334.75,373.40 345.03,400.02 355.30,377.39 365.58,344.85 375.86,411.28 386.14,347.04 396.42,376.43 406.69,377.60 416.97,329.57 427.25,432.19 437.53,367.40 447.81,431.73 458.08,419.55 468.36,347.96 478.64,425.30 488.92,398.60 499.20,370.25 509.47,470.48 519.75,432.69 530.03,440.50 540.31,417.62 550.59,435.63 560.86,425.85 571.14,445.83 581.42,478.16 591.70,454.06 601.98,438.86 612.25,486.90 622.53,465.02 632.81,449.57 643.09,423.58 653.37,452.22 663.64,478.25 673.92,456.88 684.20,470.19 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,472.75 88.08,495.51 98.35,498.40 108.63,487.44 118.91,494.71 129.19,446.63 139.47,483.04 149.74,462.21 160.02,428.70 170.30,454.23 180.58,436.34 190.86,408.55 201.13,316.97 211.41,270.41 221.69,373.11 231.97,369.41 242.25,333.10 252.52,321.76 262.80,385.33 273.08,234.04 283.36,154.31 293.64,293.33 303.91,307.23 314.19,232.83 324.47,318.74 334.75,396.25 345.03,393.52 355.30,333.93 365.58,387.26 375.86,400.61 386.14,370.25 396.42,352.37 406.69,351.57 416.97,350.69 427.25,358.46 437.53,403.01 447.81,459.90 458.08,418.71 468.36,363.41 478.64,365.59 488.92,378.06 499.20,357.20 509.47,371.05 519.75,398.22 530.03,452.22 540.31,447.89 550.59,386.97 560.86,436.18 571.14,455.70 581.42,398.51 591.70,468.09 601.98,412.79 612.25,418.42 622.53,464.56 632.81,432.78 643.09,443.40 653.37,413.63 663.64,367.11 673.92,448.73 684.20,435.67 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,518.14 88.08,483.96 98.35,458.47 108.63,466.70 118.91,481.27 129.19,456.25 139.47,434.20 149.74,469.85 160.02,431.52 170.30,433.61 180.58,377.77 190.86,396.75 201.13,427.44 211.41,345.23 221.69,443.82 231.97,353.46 242.25,345.73 252.52,288.13 262.80,353.46 273.08,423.20 283.36,352.91 293.64,187.77 303.91,330.74 314.19,304.33 324.47,316.26 334.75,353.04 345.03,318.74 355.30,394.44 365.58,260.79 375.86,321.72 386.14,402.12 396.42,334.82 406.69,392.13 416.97,238.62 427.25,348.71 437.53,419.25 447.81,430.93 458.08,377.01 468.36,431.14 478.64,416.32 488.92,415.81 499.20,439.62 509.47,406.78 519.75,450.83 530.03,459.73 540.31,435.04 550.59,415.73 560.86,440.08 571.14,459.48 581.42,394.15 591.70,482.32 601.98,464.69 612.25,410.31 622.53,468.76 632.81,429.37 643.09,462.33 653.37,415.10 663.64,425.93 673.92,432.73 684.20,348.97 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,476.11 88.08,514.69 98.35,483.66 108.63,493.07 118.91,466.83 129.19,482.24 139.47,497.65 149.74,424.80 160.02,419.59 170.30,405.82 180.58,419.59 190.86,393.81 201.13,351.82 211.41,354.51 221.69,74.20 231.97,220.23 242.25,373.19 252.52,412.03 262.80,209.52 273.08,252.23 283.36,158.89 293.64,241.56 303.91,190.13 314.19,275.53 324.47,296.27 334.75,311.43 345.03,296.86 355.30,367.61 365.58,335.61 375.86,275.53 386.14,358.46 396.42,322.01 406.69,286.49 416.97,388.73 427.25,415.90 437.53,393.35 447.81,395.45 458.08,389.78 468.36,357.78 478.64,376.68 488.92,460.03 499.20,427.19 509.47,346.32 519.75,402.29 530.03,355.52 540.31,413.04 550.59,412.28 560.86,377.90 571.14,367.78 581.42,422.36 591.70,446.38 601.98,449.44 612.25,388.65 622.53,385.16 632.81,447.47 643.09,380.25 653.37,417.58 663.64,470.73 673.92,425.13 684.20,449.15 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,453.94 88.08,487.53 98.35,492.02 108.63,474.97 118.91,499.03 129.19,498.07 139.47,455.45 149.74,433.15 160.02,489.46 170.30,400.02 180.58,383.90 190.86,409.09 201.13,380.67 211.41,359.72 221.69,375.21 231.97,267.05 242.25,225.14 252.52,211.37 262.80,174.55 273.08,207.00 283.36,199.28 293.64,325.12 303.91,316.76 314.19,334.40 324.47,260.58 334.75,356.44 345.03,388.86 355.30,309.16 365.58,415.43 375.86,348.88 386.14,319.53 396.42,394.61 406.69,364.08 416.97,312.48 427.25,345.99 437.53,399.86 447.81,378.32 458.08,329.74 468.36,409.56 478.64,426.90 488.92,296.48 499.20,432.94 509.47,355.22 519.75,411.07 530.03,381.21 540.31,320.29 550.59,345.27 560.86,326.88 571.14,357.95 581.42,353.25 591.70,396.46 601.98,401.70 612.25,407.96 622.53,438.95 632.81,466.87 643.09,398.43 653.37,416.90 663.64,456.29 673.92,433.32 684.20,398.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,491.81 88.08,495.84 98.35,466.41 108.63,463.59 118.91,461.58 129.19,421.77 139.47,433.45 149.74,377.85 160.02,401.07 170.30,411.91 180.58,453.81 190.86,380.16 201.13,213.30 211.41,359.25 221.69,364.50 231.97,401.28 242.25,340.07 252.52,305.01 262.80,209.73 273.08,269.78 283.36,326.63 293.64,369.79 303.91,341.87 314.19,197.73 324.47,331.16 334.75,317.43 345.03,348.04 355.30,300.55 365.58,287.58 375.86,288.80 386.14,256.80 396.42,365.68 406.69,311.77 416.97,328.06 427.25,371.72 437.53,352.54 447.81,391.33 458.08,309.08 468.36,373.24 478.64,391.96 488.92,389.65 499.20,458.64 509.47,409.93 519.75,408.04 530.03,360.98 540.31,365.85 550.59,430.93 560.86,327.17 571.14,386.88 581.42,433.15 591.70,383.40 601.98,407.79 612.25,425.89 622.53,367.06 632.81,415.06 643.09,444.91 653.37,360.51 663.64,460.24 673.92,399.23 684.20,465.90 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.52 88.08,500.21 98.35,499.41 108.63,479.17 118.91,495.59 129.19,489.92 139.47,465.99 149.74,463.13 160.02,480.52 170.30,467.21 180.58,412.79 190.86,441.72 201.13,421.14 211.41,406.07 221.69,457.34 231.97,382.73 242.25,346.99 252.52,442.35 262.80,334.90 273.08,361.69 283.36,425.68 293.64,321.38 303.91,346.28 314.19,423.79 324.47,320.50 334.75,370.21 345.03,351.65 355.30,357.53 365.58,377.73 375.86,372.10 386.14,405.48 396.42,469.18 406.69,428.49 416.97,328.31 427.25,402.42 437.53,464.01 447.81,428.16 458.08,372.69 468.36,414.43 478.64,442.73 488.92,444.24 499.20,460.91 509.47,423.71 519.75,437.44 530.03,432.36 540.31,437.23 550.59,473.29 560.86,465.27 571.14,472.37 581.42,494.46 591.70,462.67 601.98,449.07 612.25,426.64 622.53,442.64 632.81,429.37 643.09,478.33 653.37,439.70 663.64,424.80 673.92,465.40 684.20,448.23 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,498.02 88.08,496.68 98.35,477.03 108.63,478.21 118.91,453.77 129.19,438.36 139.47,466.83 149.74,441.89 160.02,434.12 170.30,389.02 180.58,404.18 190.86,411.82 201.13,318.57 211.41,371.14 221.69,392.72 231.97,324.32 242.25,406.78 252.52,338.68 262.80,186.30 273.08,297.36 283.36,364.42 293.64,325.08 303.91,314.12 314.19,327.68 324.47,330.70 334.75,327.89 345.03,379.07 355.30,393.73 365.58,407.04 375.86,225.44 386.14,379.03 396.42,393.22 406.69,390.83 416.97,431.56 427.25,422.95 437.53,330.74 447.81,431.94 458.08,435.80 468.36,363.03 478.64,436.22 488.92,414.64 499.20,443.31 509.47,396.92 519.75,429.37 530.03,446.59 540.31,367.90 550.59,446.38 560.86,436.81 571.14,465.69 581.42,454.65 591.70,446.63 601.98,459.10 612.25,480.52 622.53,373.11 632.81,385.83 643.09,433.28 653.37,468.80 663.64,462.59 673.92,461.71 684.20,408.25 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,503.44 88.08,514.36 98.35,509.19 108.63,510.45 118.91,502.94 129.19,463.34 139.47,432.86 149.74,463.22 160.02,433.87 170.30,413.67 180.58,436.51 190.86,409.51 201.13,402.29 211.41,366.98 221.69,324.57 231.97,401.37 242.25,248.78 252.52,448.52 262.80,414.85 273.08,284.18 283.36,432.31 293.64,387.85 303.91,424.71 314.19,376.05 324.47,290.65 334.75,250.21 345.03,329.61 355.30,427.86 365.58,419.13 375.86,372.69 386.14,412.87 396.42,386.97 406.69,367.53 416.97,453.64 427.25,371.09 437.53,426.98 447.81,396.67 458.08,458.64 468.36,445.08 478.64,421.40 488.92,435.80 499.20,395.49 509.47,451.84 519.75,457.72 530.03,446.04 540.31,409.30 550.59,410.65 560.86,425.64 571.14,425.26 581.42,467.79 591.70,358.67 601.98,445.88 612.25,439.07 622.53,416.44 632.81,429.33 643.09,423.24 653.37,437.27 663.64,476.36 673.92,480.56 684.20,447.97 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,500.59 88.08,499.83 98.35,496.85 108.63,471.78 118.91,468.88 129.19,486.90 139.47,479.05 149.74,462.17 160.02,440.50 170.30,458.68 180.58,456.12 190.86,483.45 201.13,456.04 211.41,412.83 221.69,342.21 231.97,288.50 242.25,390.49 252.52,395.62 262.80,386.25 273.08,404.69 283.36,379.20 293.64,354.93 303.91,349.13 314.19,308.99 324.47,388.27 334.75,384.32 345.03,412.49 355.30,395.15 365.58,413.29 375.86,395.45 386.14,405.19 396.42,424.13 406.69,382.77 416.97,406.62 427.25,432.27 437.53,465.32 447.81,403.43 458.08,416.23 468.36,420.43 478.64,489.75 488.92,410.52 499.20,446.00 509.47,427.86 519.75,428.87 530.03,471.91 540.31,428.45 550.59,451.29 560.86,448.06 571.14,477.37 581.42,466.41 591.70,450.79 601.98,439.91 612.25,467.84 622.53,419.88 632.81,468.17 643.09,469.22 653.37,439.58 663.64,494.58 673.92,492.23 684.20,447.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,495.09 88.08,504.45 98.35,502.14 108.63,504.32 118.91,499.66 129.19,492.15 139.47,484.00 149.74,471.32 160.02,473.59 170.30,456.83 180.58,417.32 190.86,437.48 201.13,462.17 211.41,428.87 221.69,413.33 231.97,344.39 242.25,409.22 252.52,403.17 262.80,364.54 273.08,414.01 283.36,386.97 293.64,372.40 303.91,342.21 314.19,250.08 324.47,412.96 334.75,416.15 345.03,383.94 355.30,285.02 365.58,371.64 375.86,346.99 386.14,405.10 396.42,437.60 406.69,409.60 416.97,369.54 427.25,418.37 437.53,411.99 447.81,317.52 458.08,431.26 468.36,465.90 478.64,446.51 488.92,474.05 499.20,482.20 509.47,463.76 519.75,454.32 530.03,441.47 540.31,446.88 550.59,475.73 560.86,404.56 571.14,495.09 581.42,463.13 591.70,480.73 601.98,480.35 612.25,477.62 622.53,474.18 632.81,471.57 643.09,452.05 653.37,463.80 663.64,469.26 673.92,445.75 684.20,480.73 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,504.83 88.08,516.16 98.35,497.06 108.63,499.75 118.91,460.99 129.19,438.86 139.47,471.87 149.74,459.56 160.02,456.96 170.30,455.11 180.58,458.85 190.86,386.29 201.13,388.18 211.41,366.81 221.69,355.39 231.97,415.52 242.25,387.13 252.52,343.38 262.80,313.11 273.08,380.25 283.36,331.29 293.64,399.23 303.91,360.01 314.19,391.33 324.47,272.30 334.75,329.65 345.03,370.46 355.30,402.38 365.58,363.24 375.86,313.32 386.14,357.49 396.42,410.65 406.69,385.92 416.97,379.62 427.25,433.66 437.53,384.95 447.81,451.59 458.08,407.16 468.36,428.16 478.64,387.18 488.92,390.83 499.20,402.17 509.47,421.82 519.75,478.58 530.03,435.84 540.31,426.22 550.59,398.26 560.86,416.02 571.14,447.01 581.42,443.02 591.70,445.88 601.98,444.28 612.25,443.90 622.53,434.33 632.81,442.18 643.09,474.93 653.37,457.59 663.64,431.31 673.92,430.89 684.20,458.98 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.65 88.08,488.62 98.35,496.30 108.63,457.59 118.91,468.93 129.19,502.94 139.47,447.85 149.74,473.63 160.02,420.01 170.30,438.57 180.58,396.54 190.86,425.30 201.13,376.80 211.41,439.07 221.69,246.47 231.97,396.16 242.25,409.68 252.52,355.52 262.80,330.28 273.08,374.71 283.36,392.00 293.64,423.75 303.91,401.41 314.19,417.95 324.47,299.84 334.75,356.27 345.03,408.21 355.30,360.26 365.58,384.78 375.86,416.27 386.14,422.57 396.42,434.87 406.69,336.16 416.97,435.21 427.25,386.17 437.53,443.57 447.81,436.51 458.08,450.28 468.36,398.22 478.64,472.96 488.92,462.50 499.20,459.56 509.47,473.67 519.75,455.28 530.03,486.48 540.31,470.73 550.59,492.73 560.86,372.48 571.14,453.73 581.42,473.92 591.70,440.21 601.98,463.47 612.25,465.69 622.53,458.47 632.81,464.73 643.09,458.89 653.37,460.11 663.64,479.93 673.92,448.06 684.20,447.64 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.44 88.08,495.59 98.35,488.62 108.63,501.89 118.91,483.24 129.19,469.35 139.47,459.86 149.74,465.69 160.02,448.31 170.30,438.40 180.58,413.71 190.86,418.75 201.13,415.31 211.41,390.20 221.69,357.95 231.97,273.68 242.25,385.87 252.52,346.11 262.80,366.98 273.08,337.00 283.36,380.58 293.64,361.23 303.91,306.43 314.19,302.11 324.47,361.19 334.75,371.85 345.03,389.91 355.30,355.77 365.58,407.58 375.86,393.10 386.14,370.30 396.42,315.17 406.69,390.20 416.97,422.95 427.25,393.22 437.53,387.76 447.81,464.73 458.08,424.13 468.36,438.44 478.64,440.25 488.92,465.74 499.20,435.17 509.47,469.01 519.75,454.36 530.03,477.45 540.31,484.29 550.59,491.85 560.86,468.55 571.14,483.37 581.42,464.14 591.70,452.64 601.98,454.73 612.25,403.51 622.53,431.85 632.81,446.25 643.09,466.32 653.37,452.47 663.64,454.69 673.92,478.67 684.20,460.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,497.02 88.08,498.02 98.35,510.37 108.63,507.47 118.91,490.22 129.19,497.31 139.47,484.50 149.74,461.29 160.02,470.19 170.30,464.56 180.58,479.51 190.86,404.64 201.13,441.68 211.41,376.18 221.69,413.80 231.97,346.83 242.25,411.15 252.52,393.43 262.80,354.76 273.08,336.37 283.36,381.09 293.64,404.52 303.91,365.47 314.19,369.96 324.47,409.51 334.75,381.09 345.03,433.24 355.30,467.04 365.58,398.30 375.86,387.05 386.14,295.26 396.42,358.41 406.69,290.39 416.97,436.55 427.25,464.94 437.53,419.25 447.81,445.46 458.08,420.26 468.36,373.53 478.64,434.41 488.92,448.48 499.20,458.01 509.47,472.66 519.75,482.66 530.03,467.25 540.31,451.75 550.59,468.05 560.86,436.72 571.14,448.56 581.42,424.29 591.70,484.04 601.98,465.02 612.25,481.86 622.53,443.90 632.81,434.62 643.09,471.53 653.37,450.91 663.64,481.19 673.92,442.05 684.20,453.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.92 88.08,503.11 98.35,503.44 108.63,512.51 118.91,490.55 129.19,438.70 139.47,434.96 149.74,476.99 160.02,465.61 170.30,409.98 180.58,376.01 190.86,318.44 201.13,334.82 211.41,445.50 221.69,303.66 231.97,425.43 242.25,320.71 252.52,327.72 262.80,281.24 273.08,324.45 283.36,369.54 293.64,333.77 303.91,273.47 314.19,232.37 324.47,141.96 334.75,352.87 345.03,303.37 355.30,397.17 365.58,335.45 375.86,355.89 386.14,160.73 396.42,360.26 406.69,330.53 416.97,368.41 427.25,415.18 437.53,350.56 447.81,216.28 458.08,349.13 468.36,347.88 478.64,363.58 488.92,417.66 499.20,372.94 509.47,373.36 519.75,413.71 530.03,361.56 540.31,448.77 550.59,406.74 560.86,415.56 571.14,429.96 581.42,467.12 591.70,434.58 601.98,409.68 612.25,401.33 622.53,337.55 632.81,437.44 643.09,378.61 653.37,462.92 663.64,446.13 673.92,459.94 684.20,472.41 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,472.29 88.08,402.59 98.35,492.57 108.63,475.69 118.91,480.35 129.19,489.88 139.47,465.06 149.74,419.51 160.02,439.49 170.30,421.27 180.58,361.10 190.86,348.17 201.13,365.97 211.41,294.00 221.69,285.40 231.97,281.87 242.25,329.99 252.52,350.18 262.80,259.62 273.08,307.78 283.36,207.72 293.64,277.59 303.91,334.35 314.19,154.27 324.47,246.31 334.75,252.35 345.03,405.57 355.30,272.30 365.58,293.63 375.86,347.58 386.14,386.00 396.42,331.42 406.69,391.46 416.97,400.78 427.25,435.38 437.53,378.65 447.81,453.06 458.08,444.99 468.36,392.51 478.64,437.81 488.92,376.93 499.20,454.86 509.47,397.51 519.75,437.23 530.03,416.19 540.31,448.77 550.59,424.63 560.86,419.80 571.14,456.62 581.42,459.40 591.70,442.68 601.98,424.71 612.25,459.94 622.53,450.45 632.81,461.41 643.09,476.32 653.37,426.73 663.64,434.12 673.92,434.58 684.20,384.45 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,494.25 88.08,509.11 98.35,510.96 108.63,507.98 118.91,459.94 129.19,482.66 139.47,461.75 149.74,465.02 160.02,458.22 170.30,388.56 180.58,410.23 190.86,403.01 201.13,394.65 211.41,419.55 221.69,391.88 231.97,368.66 242.25,315.12 252.52,295.05 262.80,346.53 273.08,347.37 283.36,342.96 293.64,207.68 303.91,359.04 314.19,351.44 324.47,414.13 334.75,337.80 345.03,352.58 355.30,371.22 365.58,309.16 375.86,278.72 386.14,367.48 396.42,430.68 406.69,435.04 416.97,428.49 427.25,447.05 437.53,470.06 447.81,355.64 458.08,420.72 468.36,372.61 478.64,387.30 488.92,335.87 499.20,407.88 509.47,367.40 519.75,359.80 530.03,391.16 540.31,417.53 550.59,318.69 560.86,421.65 571.14,376.89 581.42,456.88 591.70,347.33 601.98,442.52 612.25,411.61 622.53,485.93 632.81,342.12 643.09,334.06 653.37,381.21 663.64,318.61 673.92,351.49 684.20,465.53 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,468.51 88.08,485.85 98.35,492.94 108.63,484.67 118.91,497.90 129.19,470.86 139.47,480.01 149.74,443.19 160.02,393.77 170.30,421.77 180.58,426.10 190.86,375.25 201.13,325.83 211.41,383.06 221.69,332.38 231.97,224.68 242.25,265.41 252.52,299.76 262.80,226.91 273.08,343.84 283.36,316.55 293.64,342.50 303.91,350.23 314.19,258.57 324.47,298.54 334.75,381.05 345.03,228.38 355.30,234.42 365.58,314.12 375.86,367.48 386.14,272.63 396.42,188.36 406.69,421.19 416.97,344.89 427.25,384.32 437.53,358.50 447.81,438.28 458.08,336.33 468.36,391.46 478.64,409.93 488.92,419.80 499.20,448.06 509.47,426.73 519.75,374.45 530.03,421.10 540.31,404.48 550.59,396.20 560.86,399.39 571.14,333.60 581.42,402.17 591.70,406.99 601.98,389.95 612.25,429.67 622.53,408.51 632.81,414.05 643.09,380.04 653.37,418.58 663.64,431.52 673.92,357.62 684.20,354.30 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,496.77 88.08,506.63 98.35,507.35 108.63,492.31 118.91,443.78 129.19,490.97 139.47,448.18 149.74,477.70 160.02,443.99 170.30,398.22 180.58,412.12 190.86,399.39 201.13,407.92 211.41,412.24 221.69,305.68 231.97,299.25 242.25,324.53 252.52,417.28 262.80,307.23 273.08,346.57 283.36,283.42 293.64,327.13 303.91,449.40 314.19,299.17 324.47,354.22 334.75,249.62 345.03,229.26 355.30,315.21 365.58,322.98 375.86,349.22 386.14,418.37 396.42,442.77 406.69,379.16 416.97,447.64 427.25,373.53 437.53,427.86 447.81,366.10 458.08,350.52 468.36,449.11 478.64,421.90 488.92,374.75 499.20,397.84 509.47,423.16 519.75,403.97 530.03,499.07 540.31,470.61 550.59,371.72 560.86,362.19 571.14,408.13 581.42,465.53 591.70,444.24 601.98,393.56 612.25,455.15 622.53,410.73 632.81,443.65 643.09,442.01 653.37,434.08 663.64,412.41 673.92,433.07 684.20,451.50 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,503.74 88.08,506.72 98.35,482.57 108.63,466.83 118.91,466.37 129.19,488.20 139.47,464.52 149.74,455.36 160.02,464.01 170.30,464.73 180.58,367.86 190.86,462.96 201.13,449.53 211.41,388.77 221.69,372.48 231.97,290.81 242.25,351.44 252.52,271.25 262.80,399.81 273.08,289.68 283.36,320.16 293.64,289.13 303.91,324.66 314.19,368.87 324.47,361.31 334.75,276.41 345.03,374.16 355.30,398.30 365.58,331.08 375.86,268.94 386.14,357.87 396.42,376.38 406.69,441.30 416.97,438.82 427.25,365.22 437.53,428.53 447.81,422.53 458.08,317.98 468.36,462.12 478.64,390.83 488.92,431.89 499.20,462.08 509.47,474.09 519.75,401.12 530.03,441.42 540.31,398.97 550.59,375.63 560.86,435.92 571.14,438.02 581.42,459.06 591.70,420.43 601.98,468.51 612.25,441.34 622.53,439.58 632.81,492.48 643.09,395.49 653.37,487.78 663.64,464.39 673.92,445.41 684.20,440.00 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,502.06 88.08,500.08 98.35,504.32 108.63,471.95 118.91,470.31 129.19,489.59 139.47,473.76 149.74,463.22 160.02,447.81 170.30,424.21 180.58,400.53 190.86,385.75 201.13,401.16 211.41,304.71 221.69,362.07 231.97,401.33 242.25,343.42 252.52,285.82 262.80,427.78 273.08,265.58 283.36,209.19 293.64,381.59 303.91,78.27 314.19,353.38 324.47,401.41 334.75,310.00 345.03,369.88 355.30,332.17 365.58,270.70 375.86,343.26 386.14,254.37 396.42,428.37 406.69,416.65 416.97,290.60 427.25,323.73 437.53,363.91 447.81,316.26 458.08,417.07 468.36,422.99 478.64,330.49 488.92,369.79 499.20,440.21 509.47,379.45 519.75,446.13 530.03,418.25 540.31,417.87 550.59,343.59 560.86,404.64 571.14,448.27 581.42,452.30 591.70,423.12 601.98,416.48 612.25,399.56 622.53,399.31 632.81,428.66 643.09,452.85 653.37,395.49 663.64,474.64 673.92,449.70 684.20,445.92 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,506.67 88.08,501.13 98.35,498.49 108.63,495.17 118.91,492.90 129.19,504.70 139.47,487.74 149.74,462.42 160.02,435.55 170.30,374.41 180.58,374.33 190.86,403.51 201.13,370.17 211.41,302.32 221.69,385.62 231.97,302.44 242.25,334.10 252.52,226.53 262.80,323.02 273.08,340.28 283.36,184.50 293.64,234.30 303.91,229.30 314.19,243.24 324.47,356.52 334.75,322.47 345.03,369.16 355.30,304.75 365.58,365.43 375.86,294.17 386.14,345.82 396.42,403.17 406.69,331.16 416.97,380.79 427.25,293.16 437.53,452.30 447.81,408.21 458.08,368.70 468.36,359.04 478.64,403.47 488.92,409.18 499.20,443.10 509.47,426.14 519.75,463.76 530.03,377.69 540.31,435.08 550.59,400.70 560.86,416.74 571.14,456.16 581.42,441.30 591.70,423.03 601.98,469.14 612.25,461.33 622.53,409.72 632.81,420.22 643.09,430.30 653.37,423.29 663.64,474.05 673.92,435.46 684.20,472.08 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,486.52 88.08,469.22 98.35,460.49 108.63,427.23 118.91,445.46 129.19,416.74 139.47,413.46 149.74,412.24 160.02,438.32 170.30,288.50 180.58,331.88 190.86,239.38 201.13,395.24 211.41,397.59 221.69,322.43 231.97,271.16 242.25,311.81 252.52,229.89 262.80,243.20 273.08,261.51 283.36,327.72 293.64,349.72 303.91,296.52 314.19,318.15 324.47,295.01 334.75,253.65 345.03,332.00 355.30,365.93 365.58,323.35 375.86,368.41 386.14,349.13 396.42,326.08 406.69,335.40 416.97,423.29 427.25,259.49 437.53,433.99 447.81,345.36 458.08,460.99 468.36,448.81 478.64,378.44 488.92,442.77 499.20,361.48 509.47,415.27 519.75,391.29 530.03,392.63 540.31,421.10 550.59,415.98 560.86,381.38 571.14,445.04 581.42,442.35 591.70,376.09 601.98,419.46 612.25,382.73 622.53,453.01 632.81,440.79 643.09,467.12 653.37,364.21 663.64,450.75 673.92,435.97 684.20,364.63 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,487.36 88.08,502.60 98.35,482.95 108.63,479.26 118.91,503.11 129.19,474.43 139.47,495.38 149.74,492.44 160.02,448.10 170.30,448.23 180.58,417.91 190.86,370.63 201.13,383.27 211.41,409.09 221.69,371.60 231.97,265.12 242.25,366.94 252.52,262.14 262.80,427.61 273.08,322.43 283.36,293.67 293.64,350.56 303.91,299.50 314.19,364.54 324.47,358.83 334.75,332.34 345.03,281.45 355.30,411.11 365.58,392.68 375.86,444.15 386.14,395.41 396.42,391.12 406.69,403.30 416.97,446.46 427.25,392.93 437.53,445.25 447.81,395.57 458.08,343.84 468.36,344.77 478.64,413.29 488.92,418.71 499.20,432.86 509.47,461.54 519.75,399.73 530.03,379.53 540.31,431.10 550.59,426.27 560.86,470.14 571.14,379.66 581.42,463.89 591.70,394.94 601.98,476.61 612.25,423.58 622.53,417.20 632.81,474.55 643.09,469.43 653.37,421.06 663.64,444.62 673.92,435.84 684.20,431.22 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.91 88.08,486.90 98.35,510.96 108.63,481.06 118.91,476.78 129.19,473.04 139.47,471.61 149.74,409.35 160.02,491.05 170.30,455.78 180.58,410.02 190.86,425.68 201.13,352.79 211.41,340.99 221.69,277.67 231.97,358.46 242.25,413.75 252.52,410.86 262.80,450.03 273.08,234.25 283.36,286.07 293.64,407.41 303.91,405.52 314.19,339.65 324.47,404.18 334.75,412.33 345.03,406.95 355.30,380.63 365.58,386.00 375.86,386.97 386.14,377.94 396.42,409.60 406.69,302.40 416.97,414.01 427.25,398.64 437.53,403.05 447.81,427.99 458.08,441.59 468.36,480.85 478.64,461.41 488.92,440.84 499.20,443.06 509.47,439.79 519.75,420.22 530.03,482.66 540.31,455.66 550.59,426.02 560.86,464.56 571.14,481.19 581.42,439.96 591.70,444.74 601.98,448.35 612.25,454.90 622.53,463.01 632.81,466.49 643.09,474.97 653.37,442.14 663.64,451.04 673.92,457.21 684.20,442.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,484.88 88.08,493.45 98.35,487.95 108.63,507.09 118.91,484.84 129.19,483.24 139.47,442.89 149.74,429.46 160.02,442.43 170.30,426.85 180.58,425.18 190.86,331.54 201.13,421.44 211.41,350.06 221.69,349.76 231.97,238.45 242.25,374.83 252.52,336.75 262.80,308.11 273.08,349.81 283.36,355.05 293.64,154.02 303.91,365.38 314.19,325.24 324.47,258.48 334.75,360.98 345.03,241.27 355.30,218.09 365.58,169.51 375.86,403.93 386.14,365.09 396.42,222.54 406.69,358.41 416.97,399.65 427.25,288.34 437.53,331.04 447.81,278.51 458.08,416.99 468.36,350.56 478.64,342.79 488.92,395.95 499.20,377.69 509.47,393.85 519.75,424.42 530.03,452.17 540.31,438.82 550.59,392.55 560.86,482.03 571.14,371.51 581.42,466.11 591.70,421.52 601.98,462.84 612.25,447.55 622.53,466.91 632.81,421.73 643.09,472.62 653.37,460.74 663.64,445.37 673.92,423.03 684.20,419.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,504.78 88.08,498.95 98.35,492.78 108.63,456.50 118.91,476.27 129.19,426.48 139.47,453.35 149.74,421.40 160.02,440.29 170.30,343.51 180.58,467.71 190.86,402.46 201.13,376.85 211.41,381.38 221.69,418.12 231.97,117.32 242.25,388.27 252.52,227.33 262.80,382.47 273.08,298.33 283.36,265.41 293.64,352.33 303.91,328.35 314.19,319.11 324.47,381.72 334.75,273.30 345.03,318.27 355.30,300.09 365.58,403.26 375.86,319.49 386.14,229.22 396.42,372.40 406.69,305.47 416.97,308.11 427.25,391.54 437.53,342.00 447.81,415.48 458.08,420.98 468.36,363.20 478.64,441.68 488.92,424.71 499.20,375.13 509.47,381.59 519.75,423.75 530.03,439.41 540.31,396.41 550.59,411.91 560.86,453.22 571.14,433.24 581.42,433.36 591.70,353.92 601.98,430.93 612.25,423.12 622.53,413.17 632.81,444.62 643.09,433.49 653.37,456.75 663.64,435.63 673.92,442.94 684.20,457.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,500.46 88.08,482.41 98.35,498.99 108.63,504.03 118.91,480.05 129.19,431.10 139.47,468.26 149.74,464.85 160.02,476.44 170.30,467.79 180.58,474.89 190.86,413.96 201.13,447.47 211.41,358.71 221.69,324.07 231.97,395.95 242.25,436.64 252.52,398.05 262.80,259.62 273.08,298.83 283.36,375.21 293.64,327.93 303.91,392.63 314.19,358.83 324.47,405.27 334.75,326.84 345.03,357.74 355.30,349.18 365.58,317.77 375.86,412.45 386.14,447.72 396.42,398.81 406.69,429.25 416.97,409.14 427.25,400.91 437.53,424.71 447.81,448.35 458.08,426.18 468.36,463.13 478.64,459.40 488.92,449.61 499.20,448.39 509.47,437.86 519.75,484.21 530.03,440.88 540.31,419.63 550.59,476.06 560.86,495.42 571.14,457.67 581.42,449.74 591.70,476.32 601.98,462.21 612.25,475.65 622.53,449.86 632.81,468.17 643.09,479.17 653.37,483.75 663.64,445.67 673.92,454.94 684.20,457.38 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.91 88.08,500.25 98.35,494.75 108.63,484.13 118.91,482.24 129.19,489.54 139.47,456.88 149.74,461.96 160.02,467.67 170.30,429.46 180.58,461.45 190.86,414.68 201.13,350.06 211.41,396.04 221.69,278.59 231.97,329.19 242.25,254.28 252.52,269.61 262.80,281.28 273.08,359.30 283.36,199.53 293.64,290.10 303.91,358.16 314.19,237.15 324.47,272.25 334.75,358.41 345.03,434.03 355.30,401.75 365.58,410.52 375.86,386.59 386.14,318.95 396.42,404.01 406.69,330.70 416.97,408.84 427.25,317.10 437.53,449.57 447.81,351.44 458.08,391.04 468.36,380.63 478.64,479.89 488.92,406.62 499.20,399.06 509.47,391.58 519.75,441.17 530.03,389.82 540.31,388.52 550.59,366.73 560.86,400.91 571.14,398.60 581.42,342.37 591.70,429.58 601.98,429.46 612.25,425.34 622.53,435.17 632.81,442.35 643.09,398.51 653.37,426.02 663.64,427.82 673.92,397.25 684.20,355.18 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.19 88.08,494.92 98.35,482.53 108.63,494.54 118.91,479.09 129.19,430.09 139.47,478.71 149.74,445.25 160.02,442.73 170.30,407.96 180.58,333.68 190.86,353.80 201.13,414.13 211.41,315.17 221.69,399.98 231.97,408.21 242.25,396.20 252.52,330.41 262.80,359.38 273.08,398.89 283.36,188.82 293.64,379.20 303.91,302.99 314.19,288.84 324.47,194.41 334.75,258.78 345.03,382.18 355.30,359.30 365.58,324.32 375.86,374.37 386.14,307.31 396.42,273.93 406.69,427.06 416.97,234.72 427.25,380.84 437.53,346.70 447.81,436.93 458.08,433.40 468.36,389.19 478.64,437.52 488.92,425.18 499.20,433.66 509.47,480.31 519.75,452.55 530.03,440.21 540.31,463.51 550.59,435.17 560.86,487.95 571.14,427.23 581.42,443.57 591.70,401.45 601.98,437.23 612.25,388.77 622.53,420.39 632.81,414.68 643.09,394.90 653.37,401.75 663.64,459.56 673.92,459.40 684.20,362.74 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,518.43 88.08,506.97 98.35,493.66 108.63,493.11 118.91,487.57 129.19,491.73 139.47,451.54 149.74,467.84 160.02,452.72 170.30,442.85 180.58,385.50 190.86,381.89 201.13,421.19 211.41,413.00 221.69,318.99 231.97,394.15 242.25,387.55 252.52,285.40 262.80,305.26 273.08,308.66 283.36,326.04 293.64,424.84 303.91,399.60 314.19,394.15 324.47,429.96 334.75,398.47 345.03,391.84 355.30,353.50 365.58,371.30 375.86,393.94 386.14,420.35 396.42,367.15 406.69,366.85 416.97,441.21 427.25,464.98 437.53,419.05 447.81,410.90 458.08,441.26 468.36,450.66 478.64,438.36 488.92,380.58 499.20,443.44 509.47,440.12 519.75,442.47 530.03,468.68 540.31,470.98 550.59,444.41 560.86,441.13 571.14,472.03 581.42,476.32 591.70,474.30 601.98,433.66 612.25,462.29 622.53,442.14 632.81,450.12 643.09,437.39 653.37,433.11 663.64,423.41 673.92,419.13 684.20,379.62 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.82 88.08,502.64 98.35,487.28 108.63,471.19 118.91,482.70 129.19,442.81 139.47,456.67 149.74,409.81 160.02,442.73 170.30,432.02 180.58,419.09 190.86,468.63 201.13,424.38 211.41,387.64 221.69,341.07 231.97,438.40 242.25,321.63 252.52,412.91 262.80,317.31 273.08,421.52 283.36,302.78 293.64,320.16 303.91,331.46 314.19,353.63 324.47,373.53 334.75,343.72 345.03,416.48 355.30,355.18 365.58,335.19 375.86,407.88 386.14,346.83 396.42,352.79 406.69,389.28 416.97,343.93 427.25,327.76 437.53,417.62 447.81,366.35 458.08,458.39 468.36,384.45 478.64,441.38 488.92,383.56 499.20,424.08 509.47,449.11 519.75,442.64 530.03,416.86 540.31,451.67 550.59,393.85 560.86,365.30 571.14,406.28 581.42,445.50 591.70,375.08 601.98,426.35 612.25,437.52 622.53,433.36 632.81,458.51 643.09,441.30 653.37,390.16 663.64,407.41 673.92,383.15 684.20,411.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,500.17 88.08,487.32 98.35,483.83 108.63,483.16 118.91,489.67 129.19,475.69 139.47,461.41 149.74,470.14 160.02,408.80 170.30,466.32 180.58,437.94 190.86,426.85 201.13,413.80 211.41,366.81 221.69,385.08 231.97,376.34 242.25,350.10 252.52,393.98 262.80,414.76 273.08,276.03 283.36,372.69 293.64,277.25 303.91,323.31 314.19,298.54 324.47,328.77 334.75,361.94 345.03,389.36 355.30,403.09 365.58,431.47 375.86,366.69 386.14,352.20 396.42,335.32 406.69,414.30 416.97,276.20 427.25,368.62 437.53,437.77 447.81,457.38 458.08,390.95 468.36,436.34 478.64,381.93 488.92,469.35 499.20,376.55 509.47,399.98 519.75,482.70 530.03,457.51 540.31,483.45 550.59,489.96 560.86,482.07 571.14,469.01 581.42,476.78 591.70,442.14 601.98,472.71 612.25,471.40 622.53,438.91 632.81,461.16 643.09,448.98 653.37,473.38 663.64,431.47 673.92,488.45 684.20,370.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,514.90 88.08,511.38 98.35,507.14 108.63,486.56 118.91,486.14 129.19,504.91 139.47,492.40 149.74,442.39 160.02,462.84 170.30,429.29 180.58,386.50 190.86,349.97 201.13,430.51 211.41,369.08 221.69,390.16 231.97,365.17 242.25,324.45 252.52,328.85 262.80,367.82 273.08,344.43 283.36,381.68 293.64,309.37 303.91,385.08 314.19,397.25 324.47,311.64 334.75,360.39 345.03,406.53 355.30,410.19 365.58,362.28 375.86,350.90 386.14,373.24 396.42,357.49 406.69,389.95 416.97,440.67 427.25,371.39 437.53,381.72 447.81,390.28 458.08,451.42 468.36,442.60 478.64,426.98 488.92,418.08 499.20,472.58 509.47,389.23 519.75,461.62 530.03,447.93 540.31,426.77 550.59,439.96 560.86,452.51 571.14,316.22 581.42,375.38 591.70,378.48 601.98,413.42 612.25,381.26 622.53,405.48 632.81,423.92 643.09,402.38 653.37,458.72 663.64,417.91 673.92,382.68 684.20,415.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,510.37 88.08,505.33 98.35,502.64 108.63,486.90 118.91,484.59 129.19,488.33 139.47,496.47 149.74,476.61 160.02,468.00 170.30,458.64 180.58,451.84 190.86,394.27 201.13,426.14 211.41,408.84 221.69,379.03 231.97,401.79 242.25,402.04 252.52,395.28 262.80,386.00 273.08,251.18 283.36,383.56 293.64,402.67 303.91,392.26 314.19,440.54 324.47,387.39 334.75,441.55 345.03,385.29 355.30,437.90 365.58,457.09 375.86,379.91 386.14,444.45 396.42,401.41 406.69,436.09 416.97,453.56 427.25,424.25 437.53,401.87 447.81,458.09 458.08,402.12 468.36,404.73 478.64,440.67 488.92,461.03 499.20,468.51 509.47,445.50 519.75,484.00 530.03,489.17 540.31,481.06 550.59,442.43 560.86,457.21 571.14,449.61 581.42,467.58 591.70,423.58 601.98,475.18 612.25,461.54 622.53,409.39 632.81,453.43 643.09,471.82 653.37,460.95 663.64,475.14 673.92,462.88 684.20,475.06 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,486.35 88.08,507.51 98.35,494.67 108.63,493.36 118.91,456.62 129.19,445.96 139.47,419.30 149.74,430.13 160.02,456.12 170.30,403.09 180.58,404.94 190.86,363.58 201.13,284.14 211.41,370.80 221.69,328.14 231.97,330.79 242.25,278.47 252.52,253.15 262.80,343.05 273.08,279.27 283.36,275.53 293.64,316.93 303.91,298.71 314.19,399.02 324.47,355.14 334.75,322.26 345.03,374.54 355.30,405.57 365.58,260.04 375.86,364.25 386.14,396.41 396.42,407.75 406.69,355.56 416.97,345.48 427.25,423.37 437.53,409.14 447.81,423.37 458.08,422.28 468.36,333.93 478.64,395.70 488.92,409.09 499.20,439.62 509.47,338.72 519.75,412.66 530.03,426.31 540.31,459.31 550.59,458.51 560.86,460.95 571.14,396.67 581.42,399.10 591.70,406.83 601.98,438.57 612.25,448.39 622.53,408.97 632.81,457.93 643.09,413.42 653.37,331.46 663.64,433.28 673.92,404.48 684.20,423.87 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.81 88.08,493.74 98.35,501.64 108.63,494.54 118.91,485.30 129.19,474.72 139.47,416.44 149.74,416.74 160.02,492.23 170.30,411.87 180.58,456.08 190.86,430.17 201.13,436.89 211.41,372.98 221.69,328.35 231.97,353.92 242.25,361.35 252.52,264.28 262.80,401.37 273.08,347.41 283.36,252.44 293.64,314.96 303.91,377.01 314.19,379.24 324.47,277.54 334.75,382.01 345.03,294.05 355.30,381.17 365.58,341.07 375.86,423.33 386.14,367.90 396.42,308.28 406.69,405.99 416.97,333.05 427.25,357.24 437.53,383.90 447.81,396.54 458.08,418.08 468.36,445.33 478.64,402.54 488.92,364.92 499.20,447.64 509.47,410.27 519.75,467.79 530.03,399.65 540.31,448.52 550.59,419.21 560.86,423.16 571.14,456.75 581.42,436.22 591.70,492.65 601.98,471.99 612.25,478.96 622.53,466.20 632.81,425.30 643.09,425.01 653.37,484.84 663.64,444.28 673.92,462.67 684.20,466.66 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.82 88.08,474.93 98.35,492.78 108.63,474.05 118.91,488.66 129.19,495.67 139.47,491.26 149.74,446.63 160.02,478.54 170.30,393.31 180.58,411.95 190.86,407.50 201.13,414.59 211.41,310.17 221.69,330.62 231.97,301.65 242.25,416.74 252.52,107.95 262.80,429.00 273.08,356.99 283.36,338.97 293.64,378.02 303.91,366.39 314.19,400.57 324.47,314.79 334.75,162.16 345.03,402.80 355.30,161.74 365.58,330.24 375.86,340.28 386.14,337.38 396.42,352.24 406.69,326.80 416.97,413.46 427.25,432.57 437.53,399.44 447.81,434.92 458.08,285.56 468.36,384.99 478.64,344.68 488.92,387.51 499.20,414.05 509.47,408.42 519.75,458.09 530.03,403.13 540.31,485.97 550.59,456.71 560.86,458.22 571.14,413.96 581.42,464.27 591.70,455.20 601.98,453.85 612.25,451.88 622.53,409.89 632.81,406.32 643.09,460.07 653.37,415.77 663.64,417.16 673.92,465.19 684.20,467.96 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,515.74 88.08,509.28 98.35,501.72 108.63,498.40 118.91,492.57 129.19,478.88 139.47,483.33 149.74,497.39 160.02,464.60 170.30,441.63 180.58,384.03 190.86,461.66 201.13,457.80 211.41,369.83 221.69,434.66 231.97,368.70 242.25,385.75 252.52,300.81 262.80,246.47 273.08,406.70 283.36,270.24 293.64,340.07 303.91,315.84 314.19,424.84 324.47,389.82 334.75,320.67 345.03,364.04 355.30,362.57 365.58,375.97 375.86,422.45 386.14,430.59 396.42,392.09 406.69,415.60 416.97,388.02 427.25,425.51 437.53,379.20 447.81,407.96 458.08,413.50 468.36,418.96 478.64,457.93 488.92,469.51 499.20,450.49 509.47,456.88 519.75,471.87 530.03,468.51 540.31,476.57 550.59,447.76 560.86,460.70 571.14,470.82 581.42,463.43 591.70,397.63 601.98,439.37 612.25,455.20 622.53,400.19 632.81,475.23 643.09,451.38 653.37,422.15 663.64,478.58 673.92,440.50 684.20,460.32 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.52 88.08,501.38 98.35,499.03 108.63,471.15 118.91,467.84 129.19,439.49 139.47,468.00 149.74,478.92 160.02,424.34 170.30,317.60 180.58,358.54 190.86,307.27 201.13,446.59 211.41,340.36 221.69,330.16 231.97,275.45 242.25,318.36 252.52,339.10 262.80,313.57 273.08,347.96 283.36,252.10 293.64,180.89 303.91,231.99 314.19,341.07 324.47,282.92 334.75,262.93 345.03,276.33 355.30,275.66 365.58,373.07 375.86,404.81 386.14,357.11 396.42,296.94 406.69,343.26 416.97,465.78 427.25,416.44 437.53,458.09 447.81,342.96 458.08,333.18 468.36,441.30 478.64,401.83 488.92,452.89 499.20,365.68 509.47,349.89 519.75,449.15 530.03,433.57 540.31,398.13 550.59,438.78 560.86,413.75 571.14,397.25 581.42,465.40 591.70,394.65 601.98,383.69 612.25,427.74 622.53,418.12 632.81,435.34 643.09,457.67 653.37,467.08 663.64,430.00 673.92,425.26 684.20,415.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.10 88.08,502.52 98.35,514.15 108.63,490.72 118.91,477.03 129.19,480.85 139.47,430.63 149.74,469.35 160.02,465.02 170.30,445.29 180.58,399.90 190.86,406.74 201.13,420.26 211.41,338.60 221.69,293.46 231.97,400.28 242.25,309.20 252.52,274.86 262.80,321.04 273.08,396.37 283.36,389.11 293.64,336.83 303.91,321.42 314.19,271.75 324.47,317.48 334.75,361.90 345.03,383.48 355.30,330.07 365.58,345.73 375.86,367.61 386.14,395.15 396.42,445.62 406.69,379.07 416.97,379.37 427.25,369.54 437.53,431.39 447.81,458.89 458.08,405.82 468.36,407.41 478.64,349.85 488.92,444.07 499.20,415.01 509.47,480.22 519.75,483.50 530.03,422.74 540.31,396.88 550.59,411.61 560.86,438.86 571.14,445.37 581.42,446.46 591.70,441.72 601.98,473.25 612.25,458.22 622.53,440.84 632.81,476.86 643.09,487.78 653.37,429.71 663.64,480.31 673.92,418.79 684.20,443.23 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,490.47 88.08,499.83 98.35,474.09 108.63,499.49 118.91,477.03 129.19,474.51 139.47,455.62 149.74,448.02 160.02,403.80 170.30,438.19 180.58,386.46 190.86,394.78 201.13,415.73 211.41,303.24 221.69,407.16 231.97,391.58 242.25,368.37 252.52,308.32 262.80,386.97 273.08,331.33 283.36,355.77 293.64,333.60 303.91,305.26 314.19,346.03 324.47,398.30 334.75,235.22 345.03,308.36 355.30,369.12 365.58,397.88 375.86,308.74 386.14,322.18 396.42,325.62 406.69,250.21 416.97,334.86 427.25,355.60 437.53,403.59 447.81,402.25 458.08,415.06 468.36,407.83 478.64,416.57 488.92,413.63 499.20,384.70 509.47,440.96 519.75,425.01 530.03,325.66 540.31,316.47 550.59,443.86 560.86,394.78 571.14,404.01 581.42,420.85 591.70,439.20 601.98,404.06 612.25,455.91 622.53,401.07 632.81,469.85 643.09,424.84 653.37,367.95 663.64,435.76 673.92,399.39 684.20,471.19 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,495.93 88.08,514.86 98.35,497.65 108.63,496.60 118.91,498.53 129.19,484.59 139.47,473.76 149.74,478.84 160.02,445.67 170.30,459.31 180.58,459.98 190.86,399.14 201.13,368.74 211.41,350.14 221.69,319.78 231.97,383.02 242.25,353.17 252.52,274.61 262.80,367.32 273.08,357.24 283.36,331.50 293.64,244.16 303.91,392.76 314.19,336.41 324.47,441.30 334.75,379.37 345.03,287.54 355.30,396.29 365.58,421.73 375.86,351.44 386.14,411.32 396.42,389.32 406.69,410.10 416.97,315.80 427.25,426.31 437.53,372.94 447.81,457.17 458.08,395.03 468.36,445.20 478.64,438.53 488.92,421.69 499.20,405.78 509.47,383.40 519.75,454.78 530.03,453.77 540.31,445.25 550.59,441.05 560.86,463.64 571.14,455.57 581.42,455.11 591.70,479.51 601.98,407.25 612.25,374.41 622.53,436.64 632.81,414.51 643.09,460.78 653.37,402.04 663.64,451.29 673.92,435.92 684.20,459.94 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,520.15 88.08,506.63 98.35,509.15 108.63,473.84 118.91,482.28 129.19,492.73 139.47,484.92 149.74,492.94 160.02,453.06 170.30,447.30 180.58,408.80 190.86,397.71 201.13,340.70 211.41,439.20 221.69,328.10 231.97,402.67 242.25,387.01 252.52,365.93 262.80,314.75 273.08,429.63 283.36,320.08 293.64,333.89 303.91,426.10 314.19,350.10 324.47,416.90 334.75,362.40 345.03,416.48 355.30,450.07 365.58,444.28 375.86,386.88 386.14,322.98 396.42,377.81 406.69,377.01 416.97,446.72 427.25,436.51 437.53,434.87 447.81,385.12 458.08,425.68 468.36,453.22 478.64,457.93 488.92,430.84 499.20,466.24 509.47,404.35 519.75,451.59 530.03,408.67 540.31,470.77 550.59,467.75 560.86,479.84 571.14,471.24 581.42,486.27 591.70,412.07 601.98,471.91 612.25,445.29 622.53,449.36 632.81,475.31 643.09,479.97 653.37,415.56 663.64,384.91 673.92,437.69 684.20,476.69 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,497.02 88.08,509.15 98.35,504.28 108.63,467.71 118.91,489.67 129.19,471.99 139.47,485.72 149.74,473.92 160.02,453.10 170.30,454.06 180.58,462.84 190.86,420.64 201.13,350.56 211.41,412.79 221.69,419.38 231.97,353.08 242.25,440.84 252.52,402.00 262.80,311.64 273.08,345.99 283.36,305.26 293.64,335.95 303.91,315.04 314.19,318.32 324.47,411.95 334.75,375.25 345.03,341.32 355.30,319.07 365.58,251.05 375.86,401.41 386.14,321.67 396.42,416.90 406.69,356.57 416.97,423.50 427.25,445.29 437.53,408.04 447.81,419.21 458.08,418.12 468.36,430.51 478.64,387.97 488.92,413.42 499.20,385.16 509.47,387.93 519.75,418.63 530.03,416.36 540.31,417.20 550.59,420.56 560.86,459.19 571.14,391.08 581.42,453.52 591.70,372.06 601.98,441.76 612.25,443.94 622.53,447.43 632.81,458.56 643.09,428.45 653.37,475.06 663.64,477.32 673.92,491.47 684.20,462.54 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,503.95 88.08,491.39 98.35,470.61 108.63,480.89 118.91,446.63 129.19,475.94 139.47,461.03 149.74,441.30 160.02,465.06 170.30,436.34 180.58,388.90 190.86,499.79 201.13,380.84 211.41,396.25 221.69,457.00 231.97,347.41 242.25,378.11 252.52,411.82 262.80,419.88 273.08,412.70 283.36,359.80 293.64,356.36 303.91,388.90 314.19,415.90 324.47,286.15 334.75,311.85 345.03,169.80 355.30,381.13 365.58,438.61 375.86,358.12 386.14,297.53 396.42,465.53 406.69,359.04 416.97,320.54 427.25,426.69 437.53,421.82 447.81,385.20 458.08,424.63 468.36,452.89 478.64,450.20 488.92,416.61 499.20,428.41 509.47,437.06 519.75,467.21 530.03,468.59 540.31,452.34 550.59,430.68 560.86,403.59 571.14,464.39 581.42,468.00 591.70,466.87 601.98,456.50 612.25,477.11 622.53,453.10 632.81,471.70 643.09,478.79 653.37,457.84 663.64,469.85 673.92,409.81 684.20,432.52 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.94 88.08,486.18 98.35,474.09 108.63,495.04 118.91,473.38 129.19,464.27 139.47,429.88 149.74,450.91 160.02,413.04 170.30,391.58 180.58,429.00 190.86,369.79 201.13,340.95 211.41,263.02 221.69,326.38 231.97,272.88 242.25,349.93 252.52,189.24 262.80,329.61 273.08,269.27 283.36,310.30 293.64,304.04 303.91,129.79 314.19,234.51 324.47,349.97 334.75,273.30 345.03,266.21 355.30,319.16 365.58,179.54 375.86,322.72 386.14,349.47 396.42,240.60 406.69,369.71 416.97,390.33 427.25,345.73 437.53,370.21 447.81,379.11 458.08,360.43 468.36,388.60 478.64,381.84 488.92,319.99 499.20,422.40 509.47,430.80 519.75,376.89 530.03,398.60 540.31,371.47 550.59,348.76 560.86,422.99 571.14,396.41 581.42,413.96 591.70,420.56 601.98,420.89 612.25,394.94 622.53,328.48 632.81,421.35 643.09,293.71 653.37,368.74 663.64,439.75 673.92,294.84 684.20,415.69 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,495.00 88.08,462.00 98.35,442.14 108.63,475.06 118.91,451.04 129.19,438.65 139.47,424.92 149.74,457.25 160.02,470.48 170.30,361.27 180.58,231.19 190.86,189.92 201.13,267.59 211.41,383.94 221.69,403.72 231.97,394.27 242.25,345.23 252.52,172.99 262.80,401.28 273.08,288.00 283.36,260.29 293.64,220.94 303.91,256.13 314.19,251.34 324.47,332.34 334.75,302.15 345.03,242.65 355.30,389.32 365.58,342.84 375.86,275.24 386.14,209.06 396.42,259.78 406.69,396.20 416.97,345.99 427.25,397.30 437.53,431.14 447.81,361.90 458.08,246.43 468.36,365.80 478.64,414.17 488.92,332.09 499.20,374.50 509.47,434.50 519.75,439.96 530.03,354.26 540.31,427.11 550.59,402.59 560.86,397.42 571.14,401.96 581.42,379.74 591.70,478.63 601.98,415.94 612.25,407.67 622.53,436.39 632.81,425.64 643.09,392.30 653.37,387.34 663.64,434.24 673.92,439.20 684.20,432.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.56 88.08,505.46 98.35,513.52 108.63,501.89 118.91,517.17 129.19,497.14 139.47,481.61 149.74,467.88 160.02,418.92 170.30,372.27 180.58,425.43 190.86,410.98 201.13,403.64 211.41,374.54 221.69,361.56 231.97,401.12 242.25,411.19 252.52,311.05 262.80,373.07 273.08,442.43 283.36,368.41 293.64,307.99 303.91,384.28 314.19,403.51 324.47,273.56 334.75,395.95 345.03,459.40 355.30,394.78 365.58,412.62 375.86,398.55 386.14,396.79 396.42,444.07 406.69,367.48 416.97,412.91 427.25,447.76 437.53,359.34 447.81,447.14 458.08,407.92 468.36,440.92 478.64,422.28 488.92,431.26 499.20,470.31 509.47,462.00 519.75,468.38 530.03,437.39 540.31,417.03 550.59,397.30 560.86,413.25 571.14,449.07 581.42,412.12 591.70,412.87 601.98,466.83 612.25,446.46 622.53,468.80 632.81,442.56 643.09,418.29 653.37,449.61 663.64,470.44 673.92,457.34 684.20,452.43 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,500.25 88.08,487.99 98.35,476.27 108.63,497.52 118.91,451.38 129.19,492.40 139.47,500.59 149.74,453.18 160.02,460.53 170.30,413.67 180.58,389.53 190.86,309.58 201.13,331.08 211.41,391.29 221.69,277.46 231.97,343.59 242.25,281.95 252.52,271.58 262.80,340.99 273.08,359.04 283.36,140.29 293.64,292.95 303.91,270.91 314.19,258.02 324.47,353.71 334.75,309.46 345.03,165.02 355.30,358.29 365.58,363.16 375.86,278.72 386.14,331.16 396.42,365.97 406.69,460.15 416.97,437.39 427.25,437.56 437.53,435.67 447.81,357.03 458.08,403.38 468.36,319.41 478.64,455.07 488.92,403.47 499.20,343.97 509.47,417.66 519.75,431.94 530.03,406.07 540.31,473.38 550.59,423.96 560.86,375.34 571.14,468.09 581.42,439.07 591.70,429.37 601.98,462.12 612.25,453.85 622.53,465.82 632.81,434.08 643.09,453.01 653.37,408.21 663.64,442.05 673.92,407.88 684.20,437.44 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,494.88 88.08,503.40 98.35,500.00 108.63,470.56 118.91,476.99 129.19,415.31 139.47,481.65 149.74,408.97 160.02,432.48 170.30,425.05 180.58,375.88 190.86,382.98 201.13,396.54 211.41,312.27 221.69,352.58 231.97,337.76 242.25,375.67 252.52,269.19 262.80,247.40 273.08,375.55 283.36,332.63 293.64,324.32 303.91,230.06 314.19,336.37 324.47,378.11 334.75,396.62 345.03,337.59 355.30,390.28 365.58,405.69 375.86,395.41 386.14,369.29 396.42,310.42 406.69,388.90 416.97,395.74 427.25,385.83 437.53,401.37 447.81,379.16 458.08,444.11 468.36,420.47 478.64,428.49 488.92,414.55 499.20,466.66 509.47,408.13 519.75,394.40 530.03,393.26 540.31,451.42 550.59,381.47 560.86,435.21 571.14,427.27 581.42,464.81 591.70,453.69 601.98,468.80 612.25,451.80 622.53,439.79 632.81,450.75 643.09,410.27 653.37,454.82 663.64,456.83 673.92,444.83 684.20,455.66 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,479.80 88.08,486.77 98.35,474.34 108.63,473.55 118.91,419.63 129.19,471.28 139.47,414.85 149.74,435.04 160.02,419.55 170.30,376.89 180.58,424.92 190.86,450.66 201.13,325.08 211.41,441.63 221.69,238.41 231.97,375.97 242.25,343.21 252.52,241.18 262.80,366.52 273.08,376.34 283.36,280.61 293.64,278.97 303.91,362.15 314.19,313.65 324.47,277.63 334.75,329.65 345.03,300.39 355.30,272.42 365.58,388.23 375.86,294.84 386.14,358.41 396.42,401.20 406.69,342.12 416.97,373.74 427.25,361.90 437.53,423.50 447.81,373.61 458.08,426.10 468.36,437.10 478.64,406.41 488.92,399.98 499.20,434.41 509.47,460.95 519.75,390.33 530.03,453.81 540.31,450.87 550.59,455.03 560.86,467.71 571.14,440.29 581.42,437.35 591.70,431.26 601.98,466.32 612.25,446.42 622.53,452.47 632.81,452.51 643.09,465.57 653.37,436.43 663.64,449.02 673.92,423.79 684.20,456.37 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,501.72 88.08,496.77 98.35,515.16 108.63,484.08 118.91,480.94 129.19,456.58 139.47,422.36 149.74,434.24 160.02,458.51 170.30,418.16 180.58,446.09 190.86,327.72 201.13,384.70 211.41,318.15 221.69,322.56 231.97,322.85 242.25,434.92 252.52,336.92 262.80,284.39 273.08,393.05 283.36,363.41 293.64,423.71 303.91,308.87 314.19,385.41 324.47,414.01 334.75,444.32 345.03,362.95 355.30,343.30 365.58,297.70 375.86,326.50 386.14,415.14 396.42,288.00 406.69,444.53 416.97,333.77 427.25,434.66 437.53,370.38 447.81,316.17 458.08,342.58 468.36,341.62 478.64,342.58 488.92,480.64 499.20,404.10 509.47,411.70 519.75,462.17 530.03,395.07 540.31,429.71 550.59,451.33 560.86,437.23 571.14,410.77 581.42,487.40 591.70,444.36 601.98,443.94 612.25,404.60 622.53,455.41 632.81,457.42 643.09,470.19 653.37,438.23 663.64,462.71 673.92,443.40 684.20,480.89 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.53 88.08,494.08 98.35,478.42 108.63,481.06 118.91,465.27 129.19,459.31 139.47,475.98 149.74,464.39 160.02,449.07 170.30,439.41 180.58,404.18 190.86,426.18 201.13,328.73 211.41,382.60 221.69,354.93 231.97,381.93 242.25,316.30 252.52,320.83 262.80,305.17 273.08,296.57 283.36,329.40 293.64,419.63 303.91,409.39 314.19,76.25 324.47,309.50 334.75,322.26 345.03,297.66 355.30,354.85 365.58,287.20 375.86,344.68 386.14,331.79 396.42,361.52 406.69,337.04 416.97,309.04 427.25,337.55 437.53,424.42 447.81,387.89 458.08,432.44 468.36,330.53 478.64,386.59 488.92,405.90 499.20,403.13 509.47,453.06 519.75,428.28 530.03,445.58 540.31,449.78 550.59,387.64 560.86,442.05 571.14,452.93 581.42,480.94 591.70,466.66 601.98,451.42 612.25,454.19 622.53,472.58 632.81,431.01 643.09,424.80 653.37,370.13 663.64,445.25 673.92,464.69 684.20,452.80 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.31 88.08,511.59 98.35,503.86 108.63,514.40 118.91,481.23 129.19,480.73 139.47,479.47 149.74,478.96 160.02,458.43 170.30,445.08 180.58,434.92 190.86,380.58 201.13,403.30 211.41,420.14 221.69,458.14 231.97,396.20 242.25,382.81 252.52,353.88 262.80,275.61 273.08,441.21 283.36,271.29 293.64,275.36 303.91,268.06 314.19,341.16 324.47,420.47 334.75,363.07 345.03,257.52 355.30,270.24 365.58,192.73 375.86,326.25 386.14,330.53 396.42,392.55 406.69,385.58 416.97,328.22 427.25,439.70 437.53,430.42 447.81,406.83 458.08,407.58 468.36,432.02 478.64,434.03 488.92,471.78 499.20,472.96 509.47,439.45 519.75,451.75 530.03,460.78 540.31,444.32 550.59,454.90 560.86,470.44 571.14,473.67 581.42,473.76 591.70,413.59 601.98,482.62 612.25,459.90 622.53,450.03 632.81,443.27 643.09,433.66 653.37,429.25 663.64,490.26 673.92,426.35 684.20,391.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,518.85 88.08,503.48 98.35,516.21 108.63,488.12 118.91,510.58 129.19,486.35 139.47,497.73 149.74,469.89 160.02,483.45 170.30,460.19 180.58,457.76 190.86,396.58 201.13,424.92 211.41,393.39 221.69,384.66 231.97,398.18 242.25,401.33 252.52,433.32 262.80,383.82 273.08,430.76 283.36,311.35 293.64,420.26 303.91,443.19 314.19,424.29 324.47,483.24 334.75,385.54 345.03,282.88 355.30,426.48 365.58,368.16 375.86,351.74 386.14,399.10 396.42,450.16 406.69,399.52 416.97,399.98 427.25,429.00 437.53,439.49 447.81,443.94 458.08,396.04 468.36,396.88 478.64,461.24 488.92,487.02 499.20,459.06 509.47,452.47 519.75,468.38 530.03,441.97 540.31,477.32 550.59,482.07 560.86,421.31 571.14,477.16 581.42,487.36 591.70,484.71 601.98,485.68 612.25,477.53 622.53,423.37 632.81,441.13 643.09,459.98 653.37,452.01 663.64,435.97 673.92,446.09 684.20,449.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,482.45 88.08,500.17 98.35,500.63 108.63,496.60 118.91,464.22 129.19,464.85 139.47,475.77 149.74,444.99 160.02,470.10 170.30,412.16 180.58,425.60 190.86,391.50 201.13,368.28 211.41,439.87 221.69,232.70 231.97,198.27 242.25,325.20 252.52,245.26 262.80,329.23 273.08,363.91 283.36,91.70 293.64,367.61 303.91,233.50 314.19,365.68 324.47,409.43 334.75,360.93 345.03,409.85 355.30,396.33 365.58,371.47 375.86,419.05 386.14,311.01 396.42,405.06 406.69,272.04 416.97,386.97 427.25,401.96 437.53,399.39 447.81,381.34 458.08,408.42 468.36,411.32 478.64,415.94 488.92,423.41 499.20,406.74 509.47,382.22 519.75,392.80 530.03,429.79 540.31,458.01 550.59,403.34 560.86,461.41 571.14,371.56 581.42,402.21 591.70,424.80 601.98,409.93 612.25,419.59 622.53,391.88 632.81,415.69 643.09,431.89 653.37,411.32 663.64,409.18 673.92,408.30 684.20,373.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,516.33 88.08,511.67 98.35,505.71 108.63,489.84 118.91,490.22 129.19,488.41 139.47,480.64 149.74,465.19 160.02,477.07 170.30,438.78 180.58,463.76 190.86,441.30 201.13,422.36 211.41,411.57 221.69,407.83 231.97,425.60 242.25,400.53 252.52,312.02 262.80,385.03 273.08,404.10 283.36,250.04 293.64,278.01 303.91,437.56 314.19,407.08 324.47,346.03 334.75,365.17 345.03,399.98 355.30,381.13 365.58,413.96 375.86,386.04 386.14,416.23 396.42,444.45 406.69,448.27 416.97,442.43 427.25,457.09 437.53,423.45 447.81,452.68 458.08,395.36 468.36,448.60 478.64,449.44 488.92,455.28 499.20,403.22 509.47,461.96 519.75,431.05 530.03,476.32 540.31,434.92 550.59,450.37 560.86,457.21 571.14,481.57 581.42,427.19 591.70,454.11 601.98,484.71 612.25,458.98 622.53,480.43 632.81,426.31 643.09,473.29 653.37,457.25 663.64,451.04 673.92,460.61 684.20,474.47 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,490.59 88.08,482.83 98.35,482.53 108.63,500.59 118.91,490.76 129.19,460.45 139.47,445.67 149.74,440.25 160.02,452.47 170.30,387.39 180.58,340.53 190.86,417.11 201.13,383.73 211.41,294.09 221.69,293.58 231.97,293.42 242.25,250.55 252.52,372.23 262.80,315.50 273.08,236.94 283.36,301.52 293.64,336.87 303.91,215.65 314.19,287.20 324.47,266.63 334.75,118.24 345.03,306.68 355.30,328.64 365.58,328.22 375.86,300.93 386.14,327.76 396.42,371.98 406.69,347.92 416.97,395.11 427.25,444.57 437.53,376.05 447.81,390.49 458.08,337.04 468.36,363.07 478.64,435.08 488.92,373.24 499.20,413.08 509.47,381.51 519.75,383.69 530.03,423.83 540.31,352.20 550.59,401.79 560.86,435.29 571.14,425.89 581.42,481.44 591.70,455.53 601.98,497.48 612.25,466.37 622.53,456.46 632.81,472.08 643.09,430.38 653.37,444.07 663.64,414.55 673.92,388.02 684.20,405.82 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,484.71 88.08,492.82 98.35,496.68 108.63,489.12 118.91,510.71 129.19,490.93 139.47,489.96 149.74,470.10 160.02,497.90 170.30,408.09 180.58,439.62 190.86,432.57 201.13,385.16 211.41,370.30 221.69,378.02 231.97,332.63 242.25,422.49 252.52,283.09 262.80,320.62 273.08,388.77 283.36,353.63 293.64,387.68 303.91,349.51 314.19,338.30 324.47,270.03 334.75,372.61 345.03,405.19 355.30,322.09 365.58,367.19 375.86,357.28 386.14,431.14 396.42,419.80 406.69,428.58 416.97,394.94 427.25,407.33 437.53,464.64 447.81,351.82 458.08,387.81 468.36,396.16 478.64,414.51 488.92,378.40 499.20,374.16 509.47,457.04 519.75,427.99 530.03,420.39 540.31,442.85 550.59,385.92 560.86,358.54 571.14,429.75 581.42,390.87 591.70,429.08 601.98,411.53 612.25,444.45 622.53,440.50 632.81,447.76 643.09,451.33 653.37,454.15 663.64,497.81 673.92,434.62 684.20,449.40 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,505.16 88.08,497.02 98.35,495.76 108.63,478.37 118.91,515.83 129.19,451.59 139.47,459.02 149.74,446.72 160.02,414.13 170.30,492.23 180.58,477.24 190.86,411.91 201.13,434.24 211.41,430.00 221.69,350.06 231.97,355.14 242.25,429.16 252.52,349.68 262.80,337.21 273.08,216.41 283.36,239.63 293.64,235.43 303.91,331.50 314.19,346.95 324.47,354.51 334.75,299.59 345.03,303.49 355.30,303.66 365.58,312.52 375.86,336.50 386.14,317.10 396.42,319.45 406.69,365.97 416.97,411.49 427.25,314.66 437.53,392.76 447.81,347.75 458.08,358.75 468.36,415.06 478.64,390.62 488.92,342.67 499.20,406.36 509.47,440.00 519.75,467.33 530.03,441.55 540.31,416.90 550.59,474.05 560.86,448.06 571.14,437.06 581.42,398.55 591.70,430.09 601.98,457.55 612.25,466.58 622.53,430.68 632.81,463.34 643.09,450.66 653.37,404.14 663.64,465.82 673.92,426.39 684.20,434.03 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,502.73 88.08,502.31 98.35,505.37 108.63,482.57 118.91,477.11 129.19,482.74 139.47,484.25 149.74,424.92 160.02,425.97 170.30,445.20 180.58,393.64 190.86,381.80 201.13,423.29 211.41,354.01 221.69,328.18 231.97,417.28 242.25,298.41 252.52,177.82 262.80,267.22 273.08,303.91 283.36,358.54 293.64,392.84 303.91,310.72 314.19,404.06 324.47,336.08 334.75,332.55 345.03,272.59 355.30,383.10 365.58,449.61 375.86,407.67 386.14,322.22 396.42,403.09 406.69,305.59 416.97,395.53 427.25,390.03 437.53,361.27 447.81,484.00 458.08,433.74 468.36,405.99 478.64,424.55 488.92,418.00 499.20,424.21 509.47,423.54 519.75,478.37 530.03,444.87 540.31,442.35 550.59,440.71 560.86,416.65 571.14,474.34 581.42,443.15 591.70,481.06 601.98,441.84 612.25,438.36 622.53,430.34 632.81,453.31 643.09,483.50 653.37,400.91 663.64,481.44 673.92,437.44 684.20,432.19 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,493.91 88.08,494.29 98.35,495.76 108.63,497.48 118.91,499.12 129.19,487.61 139.47,446.46 149.74,486.31 160.02,466.83 170.30,412.07 180.58,465.48 190.86,400.86 201.13,400.57 211.41,399.31 221.69,271.62 231.97,365.64 242.25,392.89 252.52,262.05 262.80,239.04 273.08,257.52 283.36,172.32 293.64,384.11 303.91,357.70 314.19,387.01 324.47,371.68 334.75,192.18 345.03,349.01 355.30,380.33 365.58,426.73 375.86,360.47 386.14,369.46 396.42,365.80 406.69,294.17 416.97,334.02 427.25,397.42 437.53,361.44 447.81,354.05 458.08,435.55 468.36,429.25 478.64,430.17 488.92,475.06 499.20,438.86 509.47,386.13 519.75,464.85 530.03,478.71 540.31,454.86 550.59,446.42 560.86,468.30 571.14,472.45 581.42,446.00 591.70,460.45 601.98,467.84 612.25,372.56 622.53,444.78 632.81,416.27 643.09,477.66 653.37,439.12 663.64,446.93 673.92,360.89 684.20,361.73 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,486.23 88.08,490.63 98.35,492.48 108.63,484.76 118.91,454.69 129.19,466.70 139.47,479.34 149.74,453.73 160.02,421.48 170.30,438.11 180.58,382.89 190.86,418.58 201.13,460.70 211.41,408.25 221.69,390.74 231.97,402.12 242.25,375.67 252.52,293.58 262.80,351.40 273.08,330.11 283.36,283.30 293.64,315.59 303.91,342.75 314.19,394.73 324.47,398.18 334.75,400.99 345.03,308.24 355.30,328.64 365.58,410.61 375.86,332.97 386.14,414.97 396.42,363.03 406.69,413.75 416.97,364.59 427.25,377.22 437.53,350.31 447.81,417.62 458.08,396.88 468.36,457.76 478.64,433.20 488.92,402.59 499.20,400.74 509.47,420.09 519.75,446.51 530.03,429.67 540.31,465.95 550.59,420.43 560.86,400.40 571.14,465.44 581.42,461.33 591.70,409.85 601.98,433.99 612.25,457.93 622.53,379.53 632.81,460.66 643.09,413.46 653.37,393.14 663.64,417.91 673.92,414.22 684.20,414.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.65 88.08,504.95 98.35,499.33 108.63,486.35 118.91,488.07 129.19,452.01 139.47,504.07 149.74,460.78 160.02,469.43 170.30,446.97 180.58,395.83 190.86,436.47 201.13,325.08 211.41,427.82 221.69,393.89 231.97,270.57 242.25,412.91 252.52,326.54 262.80,372.35 273.08,345.36 283.36,242.61 293.64,422.78 303.91,241.90 314.19,317.22 324.47,245.09 334.75,294.93 345.03,392.38 355.30,393.64 365.58,378.11 375.86,428.32 386.14,406.74 396.42,327.13 406.69,298.20 416.97,393.14 427.25,427.48 437.53,421.90 447.81,403.72 458.08,421.06 468.36,398.05 478.64,323.06 488.92,423.03 499.20,458.22 509.47,393.01 519.75,430.34 530.03,474.64 540.31,489.92 550.59,427.57 560.86,460.40 571.14,440.29 581.42,448.52 591.70,429.67 601.98,448.52 612.25,458.05 622.53,410.61 632.81,443.52 643.09,484.25 653.37,438.74 663.64,404.14 673.92,444.95 684.20,446.72 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,498.49 88.08,507.35 98.35,471.87 108.63,489.54 118.91,504.24 129.19,473.80 139.47,446.25 149.74,491.31 160.02,479.84 170.30,442.18 180.58,443.94 190.86,411.03 201.13,433.53 211.41,349.81 221.69,359.04 231.97,425.26 242.25,447.97 252.52,385.62 262.80,382.73 273.08,419.80 283.36,373.24 293.64,365.47 303.91,330.37 314.19,375.21 324.47,340.28 334.75,369.67 345.03,362.82 355.30,408.13 365.58,405.86 375.86,416.65 386.14,390.16 396.42,363.83 406.69,445.16 416.97,426.81 427.25,376.59 437.53,385.79 447.81,369.67 458.08,454.73 468.36,430.34 478.64,415.69 488.92,421.14 499.20,410.10 509.47,465.23 519.75,413.42 530.03,461.83 540.31,475.98 550.59,420.56 560.86,468.93 571.14,448.44 581.42,453.94 591.70,452.34 601.98,477.37 612.25,495.63 622.53,413.80 632.81,457.17 643.09,460.82 653.37,429.25 663.64,466.32 673.92,491.14 684.20,411.07 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,521.37 88.08,506.59 98.35,500.50 108.63,486.44 118.91,506.88 129.19,480.81 139.47,472.45 149.74,486.27 160.02,495.17 170.30,430.72 180.58,396.33 190.86,397.13 201.13,409.81 211.41,374.87 221.69,401.75 231.97,377.27 242.25,342.88 252.52,428.87 262.80,397.97 273.08,348.17 283.36,410.23 293.64,388.10 303.91,355.98 314.19,338.22 324.47,325.37 334.75,352.96 345.03,380.88 355.30,296.40 365.58,307.82 375.86,453.48 386.14,408.59 396.42,385.24 406.69,349.60 416.97,410.56 427.25,437.94 437.53,483.24 447.81,440.96 458.08,404.64 468.36,364.33 478.64,433.78 488.92,442.64 499.20,440.17 509.47,423.71 519.75,460.53 530.03,458.47 540.31,440.46 550.59,425.01 560.86,454.27 571.14,437.52 581.42,422.03 591.70,406.49 601.98,438.91 612.25,459.86 622.53,473.17 632.81,460.49 643.09,454.86 653.37,398.30 663.64,415.43 673.92,475.65 684.20,444.36 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,518.01 88.08,483.12 98.35,511.71 108.63,494.41 118.91,488.03 129.19,480.10 139.47,451.92 149.74,478.67 160.02,471.61 170.30,432.02 180.58,403.47 190.86,426.27 201.13,373.95 211.41,414.43 221.69,412.45 231.97,387.30 242.25,399.39 252.52,472.41 262.80,422.45 273.08,316.34 283.36,382.31 293.64,391.54 303.91,412.16 314.19,377.48 324.47,407.88 334.75,413.00 345.03,395.91 355.30,416.61 365.58,368.83 375.86,375.71 386.14,439.83 396.42,365.13 406.69,445.67 416.97,436.72 427.25,451.25 437.53,395.66 447.81,380.21 458.08,443.99 468.36,373.82 478.64,434.75 488.92,449.65 499.20,461.62 509.47,455.74 519.75,395.49 530.03,426.56 540.31,404.52 550.59,400.44 560.86,447.81 571.14,449.82 581.42,449.32 591.70,455.91 601.98,471.28 612.25,484.25 622.53,450.79 632.81,458.56 643.09,452.38 653.37,465.11 663.64,454.86 673.92,442.47 684.20,445.29 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,501.80 88.08,489.33 98.35,479.72 108.63,466.41 118.91,428.70 129.19,423.12 139.47,387.89 149.74,385.08 160.02,473.00 170.30,362.11 180.58,375.92 190.86,362.23 201.13,329.06 211.41,417.20 221.69,375.29 231.97,388.14 242.25,339.86 252.52,103.84 262.80,169.68 273.08,320.50 283.36,46.53 293.64,368.28 303.91,186.60 314.19,159.98 324.47,172.53 334.75,365.43 345.03,344.31 355.30,305.89 365.58,303.87 375.86,338.93 386.14,267.72 396.42,314.24 406.69,456.79 416.97,370.34 427.25,372.06 437.53,424.59 447.81,344.14 458.08,386.29 468.36,461.33 478.64,413.54 488.92,365.85 499.20,421.23 509.47,460.45 519.75,446.93 530.03,403.89 540.31,384.15 550.59,477.11 560.86,394.48 571.14,429.42 581.42,466.58 591.70,411.91 601.98,422.95 612.25,474.55 622.53,460.82 632.81,432.99 643.09,457.72 653.37,442.10 663.64,432.52 673.92,449.70 684.20,442.35 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,501.17 88.08,470.61 98.35,486.06 108.63,455.45 118.91,456.37 129.19,467.25 139.47,426.90 149.74,420.98 160.02,414.09 170.30,387.18 180.58,405.78 190.86,313.49 201.13,376.55 211.41,329.32 221.69,217.54 231.97,405.27 242.25,231.86 252.52,153.60 262.80,205.28 273.08,265.83 283.36,257.68 293.64,200.83 303.91,273.56 314.19,281.28 324.47,210.95 334.75,291.40 345.03,301.77 355.30,335.53 365.58,270.99 375.86,328.52 386.14,422.15 396.42,398.05 406.69,323.82 416.97,411.66 427.25,416.27 437.53,402.00 447.81,360.14 458.08,402.80 468.36,403.51 478.64,357.78 488.92,404.22 499.20,407.54 509.47,393.39 519.75,372.40 530.03,412.87 540.31,442.10 550.59,381.97 560.86,427.53 571.14,424.04 581.42,385.87 591.70,468.05 601.98,493.20 612.25,459.52 622.53,454.02 632.81,322.64 643.09,415.31 653.37,355.18 663.64,426.60 673.92,429.63 684.20,314.70 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.95 88.08,514.15 98.35,471.57 108.63,466.79 118.91,477.58 129.19,480.10 139.47,469.77 149.74,445.25 160.02,429.67 170.30,464.73 180.58,470.82 190.86,460.24 201.13,388.06 211.41,375.76 221.69,385.03 231.97,393.89 242.25,388.65 252.52,268.69 262.80,399.02 273.08,412.83 283.36,415.52 293.64,318.11 303.91,351.07 314.19,312.10 324.47,397.80 334.75,354.72 345.03,328.64 355.30,350.35 365.58,281.45 375.86,319.20 386.14,427.69 396.42,380.67 406.69,390.16 416.97,413.08 427.25,330.45 437.53,407.33 447.81,440.96 458.08,458.22 468.36,409.93 478.64,286.40 488.92,414.30 499.20,446.46 509.47,460.82 519.75,404.98 530.03,449.36 540.31,478.75 550.59,475.35 560.86,433.70 571.14,453.81 581.42,472.12 591.70,460.99 601.98,370.09 612.25,455.78 622.53,397.42 632.81,437.65 643.09,430.89 653.37,459.52 663.64,442.43 673.92,494.08 684.20,412.24 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,476.11 88.08,485.97 98.35,495.38 108.63,470.65 118.91,484.59 129.19,431.85 139.47,445.37 149.74,465.65 160.02,380.67 170.30,378.32 180.58,407.50 190.86,411.74 201.13,351.02 211.41,287.54 221.69,308.41 231.97,276.54 242.25,299.50 252.52,298.24 262.80,391.04 273.08,175.68 283.36,252.94 293.64,125.42 303.91,245.05 314.19,125.84 324.47,208.14 334.75,170.68 345.03,341.24 355.30,357.20 365.58,319.16 375.86,250.17 386.14,128.74 396.42,299.55 406.69,362.07 416.97,355.64 427.25,391.08 437.53,327.26 447.81,322.60 458.08,296.99 468.36,378.95 478.64,368.87 488.92,403.64 499.20,385.29 509.47,376.43 519.75,349.89 530.03,359.17 540.31,418.25 550.59,415.81 560.86,420.56 571.14,373.66 581.42,421.44 591.70,423.75 601.98,403.51 612.25,401.45 622.53,430.17 632.81,414.64 643.09,380.08 653.37,431.85 663.64,370.93 673.92,359.09 684.20,316.17 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,501.13 88.08,486.69 98.35,489.88 108.63,484.76 118.91,489.00 129.19,428.41 139.47,488.49 149.74,487.86 160.02,430.17 170.30,387.39 180.58,401.33 190.86,315.67 201.13,384.36 211.41,359.46 221.69,391.21 231.97,248.78 242.25,365.80 252.52,390.62 262.80,312.14 273.08,273.22 283.36,247.69 293.64,262.76 303.91,216.79 314.19,172.74 324.47,340.65 334.75,403.47 345.03,332.05 355.30,315.54 365.58,340.32 375.86,253.91 386.14,273.51 396.42,377.39 406.69,379.03 416.97,318.15 427.25,415.77 437.53,390.49 447.81,369.79 458.08,382.31 468.36,344.89 478.64,379.41 488.92,325.20 499.20,348.13 509.47,420.05 519.75,454.32 530.03,407.58 540.31,396.71 550.59,398.89 560.86,465.86 571.14,313.99 581.42,404.35 591.70,419.00 601.98,398.97 612.25,387.68 622.53,381.68 632.81,433.61 643.09,402.00 653.37,384.66 663.64,405.73 673.92,380.12 684.20,351.61 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,511.92 88.08,493.87 98.35,504.24 108.63,509.07 118.91,496.68 129.19,494.54 139.47,456.12 149.74,482.41 160.02,435.34 170.30,437.52 180.58,427.11 190.86,418.50 201.13,413.63 211.41,301.69 221.69,313.36 231.97,266.71 242.25,333.98 252.52,381.55 262.80,251.18 273.08,374.29 283.36,383.15 293.64,277.38 303.91,269.65 314.19,260.20 324.47,300.64 334.75,332.05 345.03,234.80 355.30,309.75 365.58,348.80 375.86,313.70 386.14,313.40 396.42,323.61 406.69,329.02 416.97,286.32 427.25,366.06 437.53,298.37 447.81,309.54 458.08,239.21 468.36,339.60 478.64,437.60 488.92,389.86 499.20,424.29 509.47,468.00 519.75,442.35 530.03,408.51 540.31,396.12 550.59,406.20 560.86,471.15 571.14,375.00 581.42,373.91 591.70,418.46 601.98,428.11 612.25,465.90 622.53,456.75 632.81,426.31 643.09,432.27 653.37,428.49 663.64,435.21 673.92,452.34 684.20,377.39 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,506.30 88.08,504.41 98.35,494.71 108.63,488.49 118.91,502.94 129.19,467.88 139.47,469.64 149.74,480.64 160.02,469.98 170.30,444.99 180.58,431.77 190.86,448.94 201.13,417.91 211.41,353.67 221.69,432.78 231.97,355.10 242.25,343.47 252.52,300.43 262.80,271.46 273.08,440.12 283.36,389.70 293.64,240.47 303.91,353.75 314.19,292.53 324.47,311.18 334.75,333.68 345.03,210.20 355.30,368.66 365.58,354.80 375.86,320.25 386.14,353.46 396.42,381.17 406.69,423.79 416.97,356.27 427.25,416.65 437.53,351.32 447.81,438.11 458.08,431.10 468.36,432.27 478.64,468.47 488.92,417.58 499.20,458.35 509.47,454.11 519.75,471.74 530.03,444.07 540.31,475.69 550.59,438.11 560.86,494.37 571.14,475.65 581.42,481.31 591.70,461.79 601.98,460.61 612.25,460.91 622.53,454.94 632.81,433.99 643.09,443.82 653.37,478.16 663.64,431.77 673.92,432.40 684.20,464.85 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,480.47 88.08,497.06 98.35,496.30 108.63,498.02 118.91,484.88 129.19,497.98 139.47,472.03 149.74,444.66 160.02,451.88 170.30,419.97 180.58,416.57 190.86,411.36 201.13,372.73 211.41,427.95 221.69,326.34 231.97,392.42 242.25,355.22 252.52,261.34 262.80,387.39 273.08,331.96 283.36,263.48 293.64,235.30 303.91,298.96 314.19,389.57 324.47,345.65 334.75,393.94 345.03,420.30 355.30,382.14 365.58,400.78 375.86,430.51 386.14,362.53 396.42,394.10 406.69,394.44 416.97,349.51 427.25,386.88 437.53,391.84 447.81,372.19 458.08,434.45 468.36,408.67 478.64,464.31 488.92,380.88 499.20,408.13 509.47,441.30 519.75,441.13 530.03,467.50 540.31,473.46 550.59,416.32 560.86,460.28 571.14,484.84 581.42,445.29 591.70,440.17 601.98,469.77 612.25,464.18 622.53,427.11 632.81,479.59 643.09,437.48 653.37,470.14 663.64,477.37 673.92,454.32 684.20,417.83 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,513.98 88.08,488.79 98.35,493.62 108.63,513.81 118.91,485.81 129.19,457.59 139.47,489.08 149.74,486.77 160.02,457.59 170.30,480.31 180.58,400.28 190.86,374.29 201.13,464.94 211.41,382.39 221.69,407.62 231.97,342.84 242.25,312.52 252.52,371.39 262.80,294.68 273.08,261.97 283.36,335.82 293.64,261.80 303.91,419.09 314.19,433.28 324.47,280.19 334.75,358.92 345.03,405.23 355.30,356.48 365.58,365.38 375.86,327.72 386.14,335.82 396.42,372.52 406.69,449.44 416.97,426.52 427.25,418.25 437.53,452.89 447.81,433.45 458.08,479.00 468.36,412.96 478.64,436.22 488.92,455.07 499.20,429.08 509.47,405.02 519.75,454.82 530.03,410.98 540.31,420.18 550.59,443.10 560.86,473.08 571.14,428.41 581.42,426.02 591.70,417.70 601.98,444.45 612.25,453.01 622.53,435.84 632.81,444.41 643.09,435.55 653.37,402.12 663.64,466.58 673.92,449.78 684.20,434.33 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,508.10 88.08,512.17 98.35,480.98 108.63,502.18 118.91,492.15 129.19,466.41 139.47,437.31 149.74,445.08 160.02,435.13 170.30,415.85 180.58,367.65 190.86,299.34 201.13,405.61 211.41,400.36 221.69,214.06 231.97,219.18 242.25,160.19 252.52,219.35 262.80,269.57 273.08,59.00 283.36,314.37 293.64,295.89 303.91,393.10 314.19,371.77 324.47,381.93 334.75,406.24 345.03,294.30 355.30,287.71 365.58,268.35 375.86,336.45 386.14,369.75 396.42,441.09 406.69,394.94 416.97,461.29 427.25,338.47 437.53,424.04 447.81,361.61 458.08,334.23 468.36,431.68 478.64,376.18 488.92,381.76 499.20,473.00 509.47,364.96 519.75,449.61 530.03,422.61 540.31,320.46 550.59,443.57 560.86,395.70 571.14,449.02 581.42,403.72 591.70,391.29 601.98,425.51 612.25,417.70 622.53,483.83 632.81,425.09 643.09,438.70 653.37,418.46 663.64,391.46 673.92,344.81 684.20,392.30 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,504.49 88.08,513.94 98.35,510.08 108.63,505.88 118.91,493.24 129.19,469.68 139.47,432.10 149.74,426.18 160.02,477.58 170.30,426.69 180.58,408.88 190.86,404.01 201.13,401.79 211.41,356.65 221.69,399.86 231.97,296.90 242.25,306.98 252.52,396.37 262.80,430.76 273.08,319.91 283.36,388.18 293.64,363.28 303.91,334.90 314.19,408.93 324.47,346.66 334.75,374.20 345.03,382.26 355.30,374.41 365.58,357.83 375.86,336.50 386.14,381.34 396.42,348.88 406.69,401.03 416.97,310.67 427.25,383.19 437.53,414.80 447.81,426.52 458.08,362.91 468.36,476.11 478.64,440.00 488.92,472.33 499.20,456.08 509.47,421.48 519.75,433.66 530.03,469.85 540.31,489.46 550.59,472.58 560.86,438.61 571.14,425.22 581.42,421.35 591.70,477.41 601.98,440.79 612.25,497.98 622.53,491.77 632.81,435.59 643.09,357.24 653.37,468.05 663.64,427.99 673.92,443.94 684.20,435.67 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,520.99 88.08,476.86 98.35,496.14 108.63,486.94 118.91,477.28 129.19,488.96 139.47,419.55 149.74,357.57 160.02,454.23 170.30,332.55 180.58,362.49 190.86,443.94 201.13,348.13 211.41,290.86 221.69,364.38 231.97,343.26 242.25,301.52 252.52,357.24 262.80,419.59 273.08,281.37 283.36,311.98 293.64,310.59 303.91,287.16 314.19,369.12 324.47,304.38 334.75,391.29 345.03,318.11 355.30,285.14 365.58,302.99 375.86,407.58 386.14,296.86 396.42,317.94 406.69,395.70 416.97,374.87 427.25,317.81 437.53,347.46 447.81,365.22 458.08,398.89 468.36,347.20 478.64,371.72 488.92,369.71 499.20,424.21 509.47,390.87 519.75,414.22 530.03,436.18 540.31,372.82 550.59,438.36 560.86,465.82 571.14,450.70 581.42,459.73 591.70,454.53 601.98,452.55 612.25,390.66 622.53,459.44 632.81,413.04 643.09,415.18 653.37,464.94 663.64,398.51 673.92,361.52 684.20,401.12 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,464.35 88.08,489.88 98.35,472.08 108.63,485.39 118.91,456.25 129.19,429.54 139.47,447.60 149.74,458.01 160.02,410.65 170.30,440.04 180.58,345.23 190.86,449.82 201.13,393.05 211.41,408.17 221.69,276.79 231.97,317.73 242.25,282.00 252.52,371.85 262.80,222.54 273.08,302.74 283.36,161.74 293.64,333.47 303.91,405.73 314.19,366.77 324.47,359.46 334.75,330.79 345.03,403.76 355.30,333.64 365.58,424.88 375.86,449.74 386.14,403.09 396.42,387.39 406.69,379.20 416.97,326.08 427.25,391.96 437.53,381.55 447.81,419.55 458.08,473.46 468.36,404.31 478.64,355.43 488.92,404.64 499.20,471.70 509.47,440.75 519.75,424.67 530.03,456.92 540.31,486.02 550.59,429.67 560.86,436.64 571.14,462.46 581.42,408.46 591.70,425.18 601.98,445.46 612.25,458.01 622.53,452.26 632.81,454.57 643.09,431.18 653.37,457.17 663.64,459.61 673.92,461.58 684.20,412.28 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,485.89 88.08,489.63 98.35,486.77 108.63,455.28 118.91,441.30 129.19,423.96 139.47,473.55 149.74,436.18 160.02,457.72 170.30,388.27 180.58,438.02 190.86,438.70 201.13,320.88 211.41,443.78 221.69,362.32 231.97,350.44 242.25,391.96 252.52,287.33 262.80,356.90 273.08,403.51 283.36,310.04 293.64,339.69 303.91,345.61 314.19,260.71 324.47,365.26 334.75,257.56 345.03,312.48 355.30,333.81 365.58,380.37 375.86,409.77 386.14,367.74 396.42,393.98 406.69,389.02 416.97,364.08 427.25,347.71 437.53,300.51 447.81,378.23 458.08,356.48 468.36,414.72 478.64,396.12 488.92,393.60 499.20,399.06 509.47,367.53 519.75,367.40 530.03,445.75 540.31,390.16 550.59,447.05 560.86,434.75 571.14,416.11 581.42,416.99 591.70,436.72 601.98,433.24 612.25,378.82 622.53,468.63 632.81,465.82 643.09,446.63 653.37,464.18 663.64,473.63 673.92,429.88 684.20,474.51 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,494.75 88.08,506.00 98.35,490.84 108.63,495.84 118.91,504.32 129.19,501.72 139.47,461.62 149.74,439.70 160.02,436.55 170.30,410.23 180.58,439.45 190.86,380.46 201.13,446.09 211.41,336.92 221.69,360.26 231.97,380.37 242.25,300.93 252.52,439.75 262.80,271.08 273.08,406.41 283.36,246.10 293.64,415.14 303.91,279.18 314.19,343.26 324.47,339.73 334.75,347.92 345.03,368.79 355.30,406.95 365.58,397.38 375.86,410.77 386.14,364.80 396.42,394.15 406.69,353.88 416.97,345.23 427.25,345.44 437.53,387.55 447.81,387.01 458.08,395.95 468.36,435.08 478.64,463.17 488.92,377.52 499.20,444.66 509.47,445.33 519.75,482.74 530.03,397.88 540.31,396.46 550.59,458.05 560.86,468.30 571.14,458.22 581.42,458.77 591.70,441.63 601.98,445.37 612.25,435.63 622.53,430.47 632.81,452.47 643.09,427.61 653.37,463.22 663.64,466.49 673.92,422.95 684.20,400.57 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.61 88.08,478.21 98.35,489.29 108.63,475.90 118.91,468.97 129.19,477.79 139.47,445.33 149.74,419.59 160.02,414.64 170.30,421.56 180.58,357.07 190.86,448.52 201.13,324.82 211.41,343.55 221.69,357.66 231.97,434.08 242.25,247.15 252.52,334.02 262.80,308.41 273.08,239.59 283.36,257.05 293.64,149.56 303.91,419.76 314.19,222.79 324.47,187.98 334.75,337.17 345.03,291.82 355.30,413.71 365.58,367.15 375.86,300.64 386.14,406.45 396.42,415.52 406.69,418.04 416.97,364.38 427.25,411.36 437.53,429.21 447.81,412.54 458.08,333.05 468.36,425.93 478.64,378.19 488.92,427.74 499.20,429.46 509.47,434.62 519.75,420.89 530.03,427.65 540.31,401.75 550.59,374.16 560.86,432.06 571.14,417.66 581.42,458.56 591.70,389.15 601.98,430.42 612.25,426.14 622.53,396.08 632.81,443.82 643.09,450.37 653.37,448.14 663.64,437.65 673.92,388.48 684.20,386.34 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,509.32 88.08,507.22 98.35,460.99 108.63,455.36 118.91,493.20 129.19,482.87 139.47,422.28 149.74,454.02 160.02,453.18 170.30,485.55 180.58,462.46 190.86,471.53 201.13,474.22 211.41,389.99 221.69,393.01 231.97,273.85 242.25,377.27 252.52,349.64 262.80,361.19 273.08,275.87 283.36,269.11 293.64,427.90 303.91,381.34 314.19,416.36 324.47,321.51 334.75,412.87 345.03,374.75 355.30,397.55 365.58,378.53 375.86,418.37 386.14,355.81 396.42,343.00 406.69,471.49 416.97,401.62 427.25,427.23 437.53,370.67 447.81,428.70 458.08,390.41 468.36,382.26 478.64,430.84 488.92,424.92 499.20,436.18 509.47,450.62 519.75,454.82 530.03,494.75 540.31,471.66 550.59,466.41 560.86,460.61 571.14,482.41 581.42,435.63 591.70,470.02 601.98,468.38 612.25,457.30 622.53,431.22 632.81,438.86 643.09,472.54 653.37,457.46 663.64,388.02 673.92,443.23 684.20,435.13 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,500.29 88.08,492.06 98.35,502.48 108.63,470.65 118.91,454.40 129.19,461.12 139.47,480.35 149.74,421.61 160.02,447.14 170.30,469.64 180.58,423.96 190.86,432.78 201.13,382.43 211.41,338.55 221.69,277.08 231.97,327.05 242.25,309.83 252.52,337.55 262.80,350.10 273.08,200.66 283.36,96.45 293.64,388.56 303.91,279.10 314.19,397.55 324.47,359.88 334.75,158.55 345.03,424.29 355.30,266.75 365.58,324.74 375.86,377.56 386.14,419.46 396.42,343.26 406.69,454.65 416.97,372.19 427.25,344.39 437.53,348.50 447.81,443.99 458.08,378.86 468.36,359.04 478.64,414.34 488.92,401.96 499.20,447.09 509.47,384.15 519.75,371.01 530.03,402.67 540.31,391.42 550.59,424.04 560.86,449.28 571.14,475.94 581.42,436.68 591.70,446.21 601.98,465.44 612.25,439.28 622.53,416.44 632.81,398.76 643.09,422.57 653.37,453.98 663.64,458.51 673.92,330.91 684.20,443.65 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<polyline points='77.80,505.41 88.08,507.39 98.35,495.25 108.63,512.93 118.91,494.96 129.19,473.34 139.47,478.33 149.74,453.14 160.02,480.43 170.30,435.80 180.58,427.82 190.86,397.51 201.13,442.64 211.41,349.60 221.69,374.92 231.97,311.72 242.25,273.43 252.52,325.37 262.80,271.83 273.08,324.49 283.36,337.80 293.64,392.34 303.91,392.21 314.19,319.70 324.47,338.43 334.75,261.76 345.03,400.15 355.30,429.92 365.58,408.09 375.86,435.92 386.14,405.69 396.42,418.54 406.69,374.45 416.97,300.13 427.25,393.77 437.53,353.38 447.81,387.64 458.08,432.73 468.36,403.68 478.64,427.65 488.92,388.86 499.20,424.63 509.47,411.91 519.75,431.98 530.03,448.73 540.31,453.81 550.59,426.35 560.86,428.49 571.14,392.68 581.42,461.66 591.70,472.29 601.98,430.68 612.25,468.00 622.53,423.03 632.81,449.65 643.09,474.89 653.37,452.93 663.64,413.54 673.92,411.36 684.20,386.42 ' style='stroke-width: 1.07; stroke: #000000; stroke-opacity: 0.051; stroke-linecap: butt;' /> +<rect x='47.48' y='22.78' width='667.04' height='522.33' style='stroke-width: 1.07; stroke: #333333;' /> +</g> +<g clip-path='url(#cpMC4wMHw3MjAuMDB8MC4wMHw1NzYuMDA=)'> +<text x='42.55' y='535.65' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='4.89px' lengthAdjust='spacingAndGlyphs'>0</text> +<text x='42.55' y='409.69' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>3000</text> +<text x='42.55' y='283.72' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>6000</text> +<text x='42.55' y='157.76' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='19.58px' lengthAdjust='spacingAndGlyphs'>9000</text> +<text x='42.55' y='31.79' text-anchor='end' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='24.47px' lengthAdjust='spacingAndGlyphs'>12000</text> +<polyline points='44.74,532.62 47.48,532.62 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,406.66 47.48,406.66 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,280.69 47.48,280.69 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,154.73 47.48,154.73 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='44.74,28.76 47.48,28.76 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='129.19,547.85 129.19,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='273.08,547.85 273.08,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='416.97,547.85 416.97,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<polyline points='591.70,547.85 591.70,545.11 ' style='stroke-width: 1.07; stroke: #333333; stroke-linecap: butt;' /> +<text x='129.19' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.40px' lengthAdjust='spacingAndGlyphs'>Feb 15</text> +<text x='273.08' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 01</text> +<text x='416.97' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='27.39px' lengthAdjust='spacingAndGlyphs'>Mar 15</text> +<text x='591.70' y='556.10' text-anchor='middle' style='font-size: 8.80px; fill: #4D4D4D; font-family: sans;' textLength='25.93px' lengthAdjust='spacingAndGlyphs'>Apr 01</text> +<text x='381.00' y='568.24' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='75.23px' lengthAdjust='spacingAndGlyphs'>Reference date</text> +<text transform='translate(13.05,283.95) rotate(-90)' text-anchor='middle' style='font-size: 11.00px; font-family: sans;' textLength='31.19px' lengthAdjust='spacingAndGlyphs'>Cases</text> +<text x='47.48' y='14.56' style='font-size: 13.20px; font-family: sans;' textLength='99.82px' lengthAdjust='spacingAndGlyphs'>day_of_week_off</text> +</g> +</svg> diff --git a/tests/testthat/_snaps/print.md b/tests/testthat/_snaps/print.md index f9b3f86..760126a 100644 --- a/tests/testthat/_snaps/print.md +++ b/tests/testthat/_snaps/print.md @@ -58,3 +58,25 @@ Distinct groups: 2 +# Print method prints day of week effect + + Code + print(mock_RtGam) + Output + =============================== + Fitted RtGam model object (MockBackend) + =============================== + + Model type: Non-adaptive (m = 1) + Specified maximum smoothing basis dimension: 5 + Family: poisson + Link function: log + Using day-of-week effects + =============================== + + Observed data points: 10 + Distinct reference dates: 10 + Distinct groups: 2 + Day-of-week levels: 10 + + diff --git a/tests/testthat/_snaps/validate.md b/tests/testthat/_snaps/validate.md index 0835203..f3f6075 100644 --- a/tests/testthat/_snaps/validate.md +++ b/tests/testthat/_snaps/validate.md @@ -1,3 +1,12 @@ +# Wrong length fails + + Code + validate(cases = cases, reference_date = dates, group = groups, day_of_week = day_of_week, + k = k, m = m) + Condition + Error: + ! `day_of_week` is not the same length as `reference_date` + # `validate_dates()` is successful Code @@ -7,6 +16,16 @@ ! `dates` is a list i Must be of type Date +# validate_day_of_week is successful + + Code + validate_day_of_week(c(NA, "a")) + Condition + Error in `check_no_missingness()`: + ! `day_of_week` has missing values + i Missing values are not supported in `day_of_week` + ! Missing element(s) index: 1 + # validate_predict_inputs handles 'obs_cases' correctly Code diff --git a/tests/testthat/data/helper_generate_stochastic_sir_rt.R b/tests/testthat/data/helper_generate_stochastic_sir_rt.R new file mode 100644 index 0000000..b7dca89 --- /dev/null +++ b/tests/testthat/data/helper_generate_stochastic_sir_rt.R @@ -0,0 +1,8 @@ +pkgload::load_all() +data <- stochastic_sir_rt[41:100, ] +fit <- RtGam( + cases = data[["obs_cases"]], + reference_date = data[["reference_date"]], + day_of_week = TRUE +) +saveRDS(fit, "tests/testthat/data/stochastic_sir_fit.rds") diff --git a/tests/testthat/data/stochastic_sir_fit.rds b/tests/testthat/data/stochastic_sir_fit.rds index b580a91..602e5ac 100644 Binary files a/tests/testthat/data/stochastic_sir_fit.rds and b/tests/testthat/data/stochastic_sir_fit.rds differ diff --git a/tests/testthat/test-RtGam.R b/tests/testthat/test-RtGam.R index 552b429..abdbd4a 100644 --- a/tests/testthat/test-RtGam.R +++ b/tests/testthat/test-RtGam.R @@ -16,7 +16,8 @@ test_that("RtGam parses inputs successfully", { "m", "backend", "formula", - "diagnostics" + "diagnostics", + "day_of_week" ) expect_s3_class(fit, "RtGam") diff --git a/tests/testthat/test-checkers.R b/tests/testthat/test-checkers.R index 2103c76..8f11303 100644 --- a/tests/testthat/test-checkers.R +++ b/tests/testthat/test-checkers.R @@ -89,7 +89,7 @@ test_that("Required input check works", { group <- c(1, 2) k <- 2 m <- 1 - + day_of_week <- FALSE expect_error( check_required_inputs_provided( @@ -156,6 +156,7 @@ test_that("Required input check works", { cases = cases, reference_date = reference_date, group = group, + day_of_week = day_of_week, k = k, m = m, backend = "gam", diff --git a/tests/testthat/test-prepare_inputs.R b/tests/testthat/test-dataset_creator.R similarity index 51% rename from tests/testthat/test-prepare_inputs.R rename to tests/testthat/test-dataset_creator.R index f6158a3..799eacc 100644 --- a/tests/testthat/test-prepare_inputs.R +++ b/tests/testthat/test-dataset_creator.R @@ -1,6 +1,7 @@ test_that("Dataframe constructed appropriately", { cases <- c(1L, 2L, 3L) reference_date <- as.Date(c("2023-01-01", "2023-01-02", "2023-01-03")) + day_of_week <- FALSE timestep <- c(0, 0.5, 1) # Without groups @@ -8,11 +9,18 @@ test_that("Dataframe constructed appropriately", { cases = cases, timestep = c(0, 0.5, 1), reference_date = reference_date, - group = rep(NA, 3) + group = rep(NA, 3), + day_of_week = FALSE ) class(expected) <- c("RtGam_gam", class(expected)) - actual <- dataset_creator(cases, reference_date, NULL, "gam") + actual <- dataset_creator( + cases = cases, + reference_date = reference_date, + group = NULL, + day_of_week = day_of_week, + backend = "gam" + ) expect_equal(actual, expected) # With groups @@ -21,11 +29,17 @@ test_that("Dataframe constructed appropriately", { cases = cases, timestep = c(0, 0.5, 1), reference_date = reference_date, - group = group + group = group, + day_of_week = FALSE ) class(expected) <- c("RtGam_gam", class(expected)) - actual <- dataset_creator(cases, reference_date, group, backend = "gam") + actual <- dataset_creator(cases, + reference_date, + group, + day_of_week, + backend = "gam" + ) expect_equal(actual, expected) }) @@ -54,3 +68,36 @@ test_that("Converts double vectors to integers with a warning", { expect_no_message(integerify_cases(integer_vec)) expect_equal(integerify_cases(integer_vec), integer_vec) }) + +test_that("Day of week parsed appropriately", { + reference_date <- as.Date(c("2023-01-01", "2023-01-02", "2023-01-3")) + + # Case 1: day_of_week is TRUE so dates are auto-parsed + expected <- as.factor(format(reference_date, "%A")) + expect_equal( + set_day_of_week_factor(TRUE, reference_date), + expected + ) + + # Case 2: day_of_week is FALSE -- rep vector of FALSE + expected <- rep(FALSE, length(reference_date)) + expect_equal( + set_day_of_week_factor(FALSE, reference_date), + expected + ) + + # Case 3: Manual vector + day_of_week_manual <- c("Weekday", "Weekend", "Holiday") + expected <- as.factor(day_of_week_manual) + + expect_equal( + set_day_of_week_factor(day_of_week_manual, reference_date), + expected + ) + + # Case 4: Surprise unreachable + expect_snapshot( + set_day_of_week_factor(NULL, reference_date), + error = TRUE + ) +}) diff --git a/tests/testthat/test-formula.R b/tests/testthat/test-formula.R index 27dc3bf..0f52568 100644 --- a/tests/testthat/test-formula.R +++ b/tests/testthat/test-formula.R @@ -1,26 +1,42 @@ +test_that("Adds day of week", { + k <- 10 + m <- 2 + is_grouped <- FALSE + day_of_week <- as.factor(c("a", "b")) + expected <- as.formula("cases ~ 1 + s(timestep, k = 10, m = 2, bs = \"ad\") + s(day_of_week, bs = \"re\")") # nolint + + f <- formula_creator(k, m, is_grouped, day_of_week) + + expect_type(f, "language") + expect_equal(deparse(f), deparse(expected)) +}) + test_that("Formula created more than 3 weeks", { k <- 10 m <- 2 is_grouped <- FALSE - expected <- "cases ~ 1 + s(timestep, k = 10, m = 2, bs = \"ad\")" + day_of_week <- c(NA, NA) + expected <- as.formula("cases ~ 1 + s(timestep, k = 10, m = 2, bs = \"ad\")") - f <- formula_creator(k, m, is_grouped) + f <- formula_creator(k, m, is_grouped, day_of_week) expect_type(f, "language") - expect_equal(expected, deparse(f)) + expect_equal(deparse(expected), deparse(f)) }) test_that("Formula created fewer than 3 weeks", { k <- 10 m <- 1 + day_of_week <- c(NA, NA) is_grouped <- FALSE - expected <- "cases ~ 1 + s(timestep, k = 10, bs = \"tp\")" + expected <- as.formula("cases ~ 1 + s(timestep, k = 10, bs = \"tp\")") - f <- formula_creator(k, m, is_grouped) + f <- formula_creator(k, m, is_grouped, day_of_week) expect_type(f, "language") - expect_equal(expected, deparse(f)) + # formula and deparse to standardize whitespace + expect_equal(deparse(expected), deparse(f)) }) test_that("Smooth basis dim created successfully", { diff --git a/tests/testthat/test-predict.R b/tests/testthat/test-predict.R index 14fa460..16547af 100644 --- a/tests/testthat/test-predict.R +++ b/tests/testthat/test-predict.R @@ -1,5 +1,23 @@ +test_that("Can turn off day of week", { + fit <- readRDS(test_path("data", "stochastic_sir_fit.rds")) + # Much easier to tell visually + p <- plot(fit, day_of_week = FALSE) + vdiffr::expect_doppelganger("day_of_week_off", p) +}) + +test_that("Can simulate all the way through", { + data <- stochastic_sir_rt[41:100, ] + fit <- RtGam(data[["obs_cases"]], + data[["reference_date"]], + day_of_week = TRUE + ) + preds <- predict(fit) + + expect_true(is.data.frame(preds)) +}) + test_that("predict can handle string dates", { - fit <- readRDS(test_path("data", "fit.rds")) + fit <- readRDS(test_path("data", "stochastic_sir_fit.rds")) # Throws properly formatted warnings expect_snapshot( @@ -12,47 +30,19 @@ test_that("predict can handle string dates", { }) test_that("predict_obs_cases predicts observed cases", { - fit <- readRDS(test_path("data", "fit.rds")) - expected <- data.frame( - reference_date = as.Date(c( - "2023-01-01", - "2023-01-02", - "2023-01-03", - "2023-01-04", - "2023-01-05", - "2023-01-06", - "2023-01-07", - "2023-01-08", - "2023-01-09", - "2023-01-10" - )), - .response = c( - 49, - 32, - 52, - 30, - 23, - 24, - 8, - 34, - 46, - 23 - ), - .draw = c( - 1L, - 1L, - 1L, - 1L, - 1L, - 1L, - 1L, - 1L, - 1L, - 1L - ) + fit <- readRDS(test_path("data", "stochastic_sir_fit.rds")) + + actual <- predict(fit, + min_date = "2023-01-01", + max_date = "2023-01-10", + n = 2, + day_of_week = TRUE ) - actual <- predict.RtGam(fit, n = 1, seed = 12345, parameter = "obs_cases") - expect_equal(actual, expected) + + expect_equal(nrow(actual), 20) + expect_setequal(colnames(actual), c("reference_date", ".response", ".draw")) + expect_true(rlang::is_integer(actual[[".response"]])) + expect_setequal(unique(actual[[".draw"]]), c(1, 2)) }) test_that("predicting little r is on correct scale", { @@ -117,6 +107,7 @@ test_that("Newdata dataframe generated correctly", { min_date = NULL, max_date = NULL, horizon = NULL, + day_of_week = FALSE, mean_delay = mean_delay ) expect_equal(colnames(actual), expected_cols) @@ -344,3 +335,128 @@ test_that("Bad dates throw appropriate status messages", { seq.Date(from = min_date, to = max_date, by = "day") ) }) + +test_that("Day of week parses good cases correctly", { + object <- list( + data = data.frame( + reference_date = as.Date(c("2023-01-01", "2023-01-02", "2023-01-03")), + day_of_week = as.factor(c("Sunday", "Monday", "Tuesday")) + ), + day_of_week = TRUE + ) + + # First case: happy path needed day of week in object + actual <- extract_dow_for_predict( + object = object, + day_of_week = TRUE, + desired_dates = "2023-01-01" + ) + # Need to test properties because new factor obj doesn't have + # all the levels + expect_true(is.factor(actual)) + expect_equal(as.character(actual), "Sunday") + + # Second case: happy path day of week can be imputed + actual <- extract_dow_for_predict( + object = object, + day_of_week = TRUE, + desired_dates = as.Date("2023-01-04") + ) + expect_equal(actual, as.factor("Wednesday")) + + # Third case: New levels override default + actual <- extract_dow_for_predict( + object = object, + day_of_week = c("Monday"), + desired_dates = as.Date("2023-01-04") + ) + expect_equal(actual, as.factor("Monday")) +}) + +test_that("Day of week prediction handles custom levels", { + object <- list( + data = data.frame( + reference_date = as.Date(c("2023-01-01", "2023-01-02", "2023-01-03")), + day_of_week = as.factor(c("Sun", "Mon", "Holiday")) + ), + day_of_week = as.factor(c("Sun", "Mon", "Holiday")) + ) + + # Can lookup dates where possible + actual <- extract_dow_for_predict( + object = object, + day_of_week = TRUE, + desired_dates = as.Date(c("2023-01-01", "2023-01-03")) + ) + expect_true(is.factor(actual)) + expect_equal(as.character(actual), c("Sun", "Holiday")) + + # Can override with custom vec + custom <- c("Holiday", "Holiday", "Mon") + actual <- extract_dow_for_predict( + object = object, + day_of_week = custom, + desired_dates = as.Date(c("2023-01-02", "2023-01-03", "2023-01-04")) + ) + expect_true(is.factor(actual)) + expect_equal(as.character(actual), custom) +}) + +test_that("Day of week throws correctly formatted errors", { + object <- list( + data = data.frame( + reference_date = as.Date(c("2023-01-01", "2023-01-02", "2023-01-03")), + day_of_week = as.factor(c("Sun", "Mon", "Holiday")) + ), + day_of_week = as.factor(c("Sun", "Mon", "Holiday")) + ) + + # New level + expect_snapshot( + error = TRUE, + extract_dow_for_predict( + object = object, + day_of_week = c("Holiday", "New level"), + desired_dates = as.Date(c("2023-01-02", "2023-01-03")) + ) + ) + + # Malformed vector + expect_snapshot( + error = TRUE, + extract_dow_for_predict( + object = object, + day_of_week = "Holiday", + desired_dates = as.Date(c("2023-01-02", "2023-01-03")) + ) + ) + + # New dates but no vec provided + expect_snapshot( + error = TRUE, + extract_dow_for_predict( + object = object, + day_of_week = TRUE, + desired_dates = as.Date(c("2023-01-04", "2023-01-05")) + ) + ) +}) + +test_that("suppress_factor_warning only supresses the one warning", { + throw_warning <- function(warning_text) { + warning(warning_text) + 2 + 2 + } + expect_equal( + suppress_factor_warning( + throw_warning("factor levels 1 not in original fit") + ), + 4 + ) + + expect_warning( + suppress_factor_warning( + throw_warning("some other warning") + ) + ) +}) diff --git a/tests/testthat/test-print.R b/tests/testthat/test-print.R index c935718..6f9ce61 100644 --- a/tests/testthat/test-print.R +++ b/tests/testthat/test-print.R @@ -45,3 +45,20 @@ test_that("print method produces output for non-adaptive", { expect_snapshot(print(mock_RtGam)) }) + +test_that("Print method prints day of week effect", { + mock_RtGam <- list( + backend = "MockBackend", + m = 1, + k = 5, + model = list(family = list(family = "poisson", link = "log")), + data = data.frame( + reference_date = as.Date("2020-01-01") + 1:10, + group = c(rep("a", 5), rep("b", 5)), + day_of_week = as.factor(1:10) + ) + ) + class(mock_RtGam) <- "RtGam" + + expect_snapshot(print(mock_RtGam)) +}) diff --git a/tests/testthat/test-validate.R b/tests/testthat/test-validate.R index e59e104..5ed8a6e 100644 --- a/tests/testthat/test-validate.R +++ b/tests/testthat/test-validate.R @@ -1,16 +1,46 @@ test_that("`validate()` is successful", { cases <- c(1, 2, 3) dates <- as.Date(c("2023-01-01", "2023-01-02", "2023-01-03")) + day_of_week <- TRUE groups <- NULL k <- 3 m <- 1 expect_equal( - validate(cases, dates, groups, k, m), + validate( + cases = cases, + reference_date = dates, + group = groups, + day_of_week = day_of_week, + k = k, + m = m + ), dates ) }) +test_that("Wrong length fails", { + cases <- c(1, 2, 3) + dates <- as.Date(c("2023-01-01", "2023-01-02", "2023-01-03")) + day_of_week <- c(1, 2) + groups <- NULL + k <- 3 + m <- 1 + + expect_snapshot( + validate( + cases = cases, + reference_date = dates, + group = groups, + day_of_week = day_of_week, + k = k, + m = m + ), + error = TRUE + ) +}) + + test_that("`validate_cases()` is successful", { cases <- c(1, 2, 3) cases_with_missing <- c(0, 2, 3, NA) @@ -111,6 +141,24 @@ test_that("`validate_min_dimensionality()` is successful", { )) }) +test_that("validate_day_of_week is successful", { + # Case 1: Day of week is true + expect_invisible(validate_day_of_week(TRUE)) + + # Case 2: Day of week is false + expect_invisible(validate_day_of_week(FALSE)) + + # Case 3: Use a good vector + expect_invisible(validate_day_of_week(c(1, 2))) + + # Case 4: Errors for a bad vector + expect_snapshot( + error = TRUE, + # Can't have NAs + validate_day_of_week(c(NA, "a")) + ) +}) + test_that("validate_predict_inputs handles 'obs_cases' correctly", { expect_snapshot( validate_predict_inputs(