fontawesome/0000755000176200001440000000000014716153232012605 5ustar liggesusersfontawesome/tests/0000755000176200001440000000000014716150410013742 5ustar liggesusersfontawesome/tests/testthat/0000755000176200001440000000000014716153232015607 5ustar liggesusersfontawesome/tests/testthat/test-fa_icon.R0000644000176200001440000002172514715741135020320 0ustar liggesuserslibrary(dplyr) test_that("Getting a basic FA icon works", { # Emit a Font Awesome icon (`file`) as SVG within `svg` tags; # refer to the icon with the "short" name expect_equal( as.character(fa(name = "file", prefer_type = "solid")), '' ) expect_equal( as.character(fa(name = "file", prefer_type = "regular")), '' ) # Emit a Font Awesome icon (`file`) as SVG within `` tags; # refer to the icon with the "long" name expect_equal( as.character(fa(name = "fas fa-file")), as.character(fa(name = "file", prefer_type = "solid")) ) expect_equal( as.character(fa(name = "far fa-file")), as.character(fa(name = "file", prefer_type = "regular")) ) # Expect that every entry in the `fa_tbl` table will produce SVG text and, # only for the icons with a single style, the results are the same whether # the full name or short name is used fa_names_counts <- fontawesome:::fa_tbl %>% dplyr::select(name) %>% dplyr::group_by(name) %>% dplyr::summarize(n = n()) fa_names_single <- fa_names_counts %>% dplyr::filter(n == 1) %>% dplyr::pull(name) fa_names_multiple <- fa_names_counts %>% dplyr::filter(n > 1) %>% dplyr::pull(name) fa_tbl_single_i <- which(fontawesome:::fa_tbl$name %in% fa_names_single) for (i in fa_tbl_single_i) { expect_true( grepl("^.svg.*svg.$", as.character(fa(name = fontawesome:::fa_tbl[[i, "name"]]))) ) expect_equal( as.character(fa(fontawesome:::fa_tbl[[i, "name"]])), as.character(fa(fontawesome:::fa_tbl[[i, "full_name"]])) ) } # In that case that an icon cannot be retrieved, # expect that the function stops expect_error(fa(name = "fas fa-files")) }) test_that("Inserting attributes and styles works for FA icons", { # Expect that the `fill = "purple"` CSS rule is rendered expect_match( as.character(fa(name = "file", fill = "purple")), "fill:purple;" ) # Expect that the `fill_opacity = 0.5` CSS rule is rendered expect_match( as.character(fa(name = "file", fill = "purple", fill_opacity = 0.5)), "fill:purple;overflow:visible;fill-opacity:0.5;" ) # Expect that the stroke CSS rules are rendered expect_match( as.character( fa( name = "file", stroke = "blue", stroke_width = "2px", stroke_opacity = 0.5 ) ), "stroke:blue;stroke-width:2px;stroke-opacity:0.5;" ) # Expect that the `height = "30em"` CSS rule is rendered expect_match( as.character(fa(name = "file", height = "30em")), "height:30em;" ) # Expect a default height of 1em expect_match( as.character(fa(name = "file")), "height:1em;" ) # Expect that the `width = "1em"` CSS rule is rendered expect_match( as.character(fa(name = "file", width = "1em")), "width:1em;" ) # Expect that fractional width values are rendered properly expect_match( as.character(fa(name = "file", width = "0.75em")), "width:0.75em;" ) expect_match( as.character(fa(name = "file", width = ".75em")), "width:.75em;" ) expect_match( as.character(fa(name = "file", width = ".756789em")), "width:.756789em;" ) # Expect that not supplying a width value will result in an error expect_error( as.character(fa(name = "file", width = "em")) ) # Expect that not giving a length unit will result in an error expect_error( as.character(fa(name = "file", width = "1")) ) expect_error( as.character(fa(name = "file", width = 1)) ) # Expect that supplying an empty string will result in an error expect_error( as.character(fa(name = "file", width = "")) ) # Expect that ending with a dot should result in an error expect_error( as.character(fa(name = "file", width = "1.em")) ) # Expect that supplying a dot for the width value will result in an error expect_error( as.character(fa(name = "file", width = ".em")) ) # Expect a default width of 0.75em expect_match( as.character(fa(name = "file")), "width:0.75em;" ) expect_match( as.character(fa(name = "file", height = "4em", width = "4em")), "width:4em;" ) expect_match( as.character(fa(name = "file", height = "4em", width = "4em")), "height:4em;" ) # Expect that the `margin_left = "1em"` and `margin_right = "1em"` # CSS rules are rendered expect_match( as.character(fa(name = "file", margin_left = "1em", margin_right = "1em")), "margin-left:1em;margin-right:1em;" ) # Expect default values of "auto" for both rules expect_match( as.character(fa(name = "file")), "margin-left:auto;margin-right:auto;" ) }) test_that("the `fa_i()` function returns an icon object", { icon <- fa_i(name = "r-project") expect_equal( as.character(icon), "" ) # Expect that the `icon` object is a `shiny.tag` expect_s3_class(icon, "shiny.tag") # Expect that the `icon` object is a list with # specific element names expect_equal(names(icon), c("name", "attribs", "children")) # For this object, expect certain values within # the list components expect_equal(icon$name, "i") expect_equal(icon$attribs$class, "fab fa-r-project") expect_equal(icon$attribs$role, "presentation") expect_equal(icon$attribs$`aria-label`, "r-project icon") expect_equal(icon$children, list()) # Expect there are certain attributes available icon_attributes <- attributes(icon) expect_setequal( names(icon_attributes), c("names", "class", "html_dependencies", "browsable_html") ) # Add a style rule to the icon icon_2 <- fa_i(name = "r-project", height = "20px") # Expect the style property to render in the `` tag expect_equal( as.character(icon_2), "" ) # Use a valid, fully-qualified icon name icon <- fa_i(name = "fab fa-r-project") # Expect that the same icon tag is produced with the fully-qualified # name compared to the short name expect_equal( as.character(icon), "" ) # Expect an error if providing invalid input (non-character, length not one) # for `name` expect_error(fa_i(1)) expect_error(fa_i(TRUE)) expect_error(fa_i(c("0", "1"))) expect_error(fa_i(character(0))) # There are *no* messages when using short name aliases or valid short # or long names expect_message(regexp = NA, fa_i("eur")) expect_message(regexp = NA, fa_i("vcard")) expect_message(regexp = NA, fa_i("euro-sign")) expect_message(regexp = NA, fa_i("fas fa-euro-sign")) # There is a message given when using an invalid name expect_message(regexp = "does not correspond to a known icon", fa_i("euroz")) # Providing an `html_dependency` object will also avoid checks that # would otherwise yield messages fake_dep <- htmltools::htmlDependency("fa", "1.0", "") expect_message(regexp = NA, fa_i("eur", html_dependency = fake_dep)) expect_message(regexp = NA, fa_i("euroz", html_dependency = fake_dep)) }) test_that("the `fa_i()` function combines fully qualified name and class", { icon_no_class <- fa_i("fas fa-arrows-rotate", class = NULL) expect_equal(icon_no_class$attribs$class, "fas fa-arrows-rotate") icon <- fa_i("arrows-rotate", class = "fa-spin", prefer_type = "solid") expect_equal(icon$attribs$class, "fas fa-arrows-rotate fa-spin") icon_qualified <- fa_i("fas fa-arrows-rotate", class = "fa-spin") expect_equal(icon_qualified$attribs$class, "fas fa-arrows-rotate fa-spin") }) test_that("Known alias names (for short name) result in retrival of icons", { # Get the complete set of known alias names for the included icons alias_names <- alias_tbl$alias # Expect that using each known alias with `fa()` will result in # an SVG string returned for (a_name in alias_names) { expect_true( grepl("^.svg.*svg.$", as.character(fa(name = a_name))) ) } }) test_that("The `fa_metadata()` function returns a list of metadata elements", { metadata <- fa_metadata() expect_type(metadata, "list") }) fontawesome/tests/testthat.R0000644000176200001440000000010214605637270015731 0ustar liggesuserslibrary(testthat) library(fontawesome) test_check("fontawesome") fontawesome/MD50000644000176200001440000000457714716153232013132 0ustar liggesusersa14473d9a42771dd5c3d38a44c089aa6 *DESCRIPTION 11caaf4ec0ba74100cac2e4e59350c43 *LICENSE b312a2b4d8e71241a31de3cdb7b66776 *NAMESPACE 2d8147e287709d2ef0c989f4df1cab0f *NEWS.md 21381cf7debb12dcb703f3e8ab03b4d0 *R/fa.R ca851b753bd6552599f68d6a80c56962 *R/fa_brands.R 13243ddc2b3fd0846f90c50d7d3c73af *R/fa_html_dependency.R ecef0cf774be616378f69196b7d098d9 *R/fa_i.R c4c6344a99eede7946d43c3709574245 *R/fa_metadata.R 08c702c99702c668d765d4dba4c01c86 *R/fa_png.R 9e66f59fb82406d12e804b298a8cad08 *R/fa_version.R 6dbd5f8bc2de2feb5e453ba514315ca9 *R/knit_print.R ef651a37580d22bed0431868060863cd *R/print.R b90a2a8beee4b81b4a860f5bc5e218c4 *R/staticimports.R e5e804e9f395211aeccf9a73200bcc57 *R/sysdata.rda 66b2ff96d87c6fe57b796b9958b7ce23 *R/utils.R 1b29af12cbe093a59ac6345022d5ef1a *R/zzz.R e4257c083286fa2292a923950427aa61 *README.md f3b481854279fac0c2d0b7ccd54899a1 *inst/apps/138-icon-fontawesome/app.R 6482469c759d5aebb3a144d9b3c68bf6 *inst/fontawesome/css/all.css 137c44fa125a1d5142cfd92f463b9542 *inst/fontawesome/css/all.min.css 3c287201d94b1d847e02aa01d3770820 *inst/fontawesome/css/v4-shims.css b179b3372e22ec97992038b52be36c15 *inst/fontawesome/css/v4-shims.min.css b7dee83cb5ee2c47b053e2620f4bbb78 *inst/fontawesome/webfonts/fa-brands-400.ttf b55b1345f0b919f0cab774ec25d6654e *inst/fontawesome/webfonts/fa-brands-400.woff2 3c264849ff4eb9b6e99eab9cd54c80ae *inst/fontawesome/webfonts/fa-regular-400.ttf aa7c5fa494807f7a9ec907defee083e8 *inst/fontawesome/webfonts/fa-regular-400.woff2 0a95f951745ba02faa8773ea6a1ebaed *inst/fontawesome/webfonts/fa-solid-900.ttf 1ec0ba058c021acf7feaa18081445d63 *inst/fontawesome/webfonts/fa-solid-900.woff2 95b97efa98f9e3fb869bc9634c43a0cc *inst/fontawesome/webfonts/fa-v4compatibility.ttf fdb652dcc200dd23b8b8040176858c36 *inst/fontawesome/webfonts/fa-v4compatibility.woff2 1b77c90eb95301b1f96c1cf4387e4ccc *man/fa.Rd 6bf146dc92ae5e0196f0fb73fde78084 *man/fa_html_dependency.Rd 0711c7842b6b482f9ba6fab816f37ce2 *man/fa_i.Rd 35f9cdd8ef943f18c0e7c0b321f15515 *man/fa_metadata.Rd 01b3d07bccdffeaeb5b1db038c1cefda *man/fa_png.Rd 144a890a5fc1bfa9d1772e64570b7196 *man/figures/fontawesome_rmd.png 54aba43d1a797519ed459b45513a5ca7 *man/figures/fontawesome_shiny_app.png a99f2c5356f0f525f85db8fd7ce2f9fd *man/figures/logo.svg 9ae00bbb6e9c3f83ded656fb0f04353b *man/print.fontawesome.Rd 684d2f9319d015be6fcaf817852c30a6 *tests/testthat.R ed5d641efccb99a38f6805db07e3acf9 *tests/testthat/test-fa_icon.R fontawesome/R/0000755000176200001440000000000014715741135013012 5ustar liggesusersfontawesome/R/fa_i.R0000644000176200001440000000730114715741135014034 0ustar liggesusers#' Generate a Font Awesome `` tag #' #' The `fa_i()` function creates a Font Awesome `` tag and not an SVG as with #' [fa()]. The primary use case for `fa_i()` is for legacy Shiny applications #' that use the `shiny::icon()` function. This function is called within a #' `shiny::icon()` call and all HTML dependencies to support icon generation are #' hosted in the **fontawesome** package. #' #' @param name The name of the Font Awesome icon. This could be as a short name #' (e.g., `"npm"`, `"drum"`, etc.), or, a full name (e.g., `"fab fa-npm"`, #' `"fas fa-drum"`, etc.). The names should correspond to current Font Awesome #' names. A list of short and full names can be accessed through the #' [fa_metadata()] function with `fa_metadata()$icon_names` and #' `fa_metadata()$icon_names_full`. If supplying a known alias to a short icon #' name (e.g., `"vcard"`, which is now `"address-card"`), it will be #' internally translated to the current icon name before returning the icon #' tag. #' @param class Additional classes to customize the style of the icon. #' @param ... Arguments passed to the `` tag of [htmltools::tags]. #' @param prefer_type Chooses the type of icon returned if: (1) providing a #' short name, and (2) that icon has both solid and regular types. #' For example, using `name = "address-book"` will result in two types of #' icons for an Address Book. By default, this preference is set to #' `"regular"` and the other option is `"solid"`. #' @param html_dependency Provides an opportunity to use a custom #' `html_dependency` object (created via a call to #' [htmltools::htmlDependency()]) instead of one supplied by the function #' (which uses Font Awesome's free assets and are bundled in the package). A #' custom `html_dependency` object is useful when you have paid icons from #' Font Awesome or would otherwise like to customize exactly which icon assets #' are used (e.g., `woff`, `woff2`, `eot`, etc.). By default, this is `NULL` #' where the function internally generates an `html_dependency`. #' #' @return An icon element. #' #' @examples #' if (interactive()) { #' #' # Create a Font Awesome icon object #' fa_i(name = "r-project") #' #' } #' #' @export fa_i <- function( name, class = NULL, ..., prefer_type = c("regular", "solid"), html_dependency = fa_html_dependency() ) { prefer_type <- match.arg(prefer_type) # Ensure that the `name` value passes basic validation checks check_name_vec(name = name) iconClass <- "" if (grepl("^fa[a-z] fa-[a-z-]+$", name)) { # Case where fully-qualified icon name is provided iconClass <- paste(c(name, class), collapse = " ") } else { # Case where short icon name is provided # Get the icon index value in `fa_tbl` idx <- get_icon_idx( name = name, prefer_type = prefer_type, fail_on_unknown_name = FALSE, msg_on_unknown_name = identical(html_dependency, fa_html_dependency()) ) if (is_na(idx)) { # Generate `iconClass` value for name that results in an NA # value for `idx` (i.e., doesn't correspond to an entry in the # `fa_tbl`) iconClass <- paste0("fa", substr(prefer_type, 1, 1), " fa-", name) } else { # Get the fully-qualified icon name from `fa_tbl` name <- iconClass <- fa_tbl[idx, ][["full_name"]] } # Append any provided `class` values to the icon name if (!is.null(class)) { iconClass <- paste(name, class) } } icon_tag <- browsable( tags$i( class = iconClass, role = "presentation", `aria-label` = paste(gsub("^fa[a-z]* fa-", "", name), "icon"), ... ) ) attachDependencies(icon_tag, html_dependency) } fontawesome/R/fa_version.R0000644000176200001440000000011714605646413015270 0ustar liggesusers# Generated by fontawesome-update.R: do not edit by hand fa_version <- "6.5.2"fontawesome/R/staticimports.R0000644000176200001440000000427614605637270016055 0ustar liggesusers# Generated by staticimports; do not edit by hand. # ====================================================================== # Imported from pkg:staticimports # ====================================================================== # Simplified version rlang:::s3_register() that just uses # warning() instead of rlang::warn() when registration fails # https://github.com/r-lib/rlang/blob/main/R/compat-s3-register.R s3_register <- function(generic, class, method = NULL) { stopifnot(is.character(generic), length(generic) == 1) stopifnot(is.character(class), length(class) == 1) pieces <- strsplit(generic, "::")[[1]] stopifnot(length(pieces) == 2) package <- pieces[[1]] generic <- pieces[[2]] caller <- parent.frame() get_method_env <- function() { top <- topenv(caller) if (isNamespace(top)) { asNamespace(environmentName(top)) } else { caller } } get_method <- function(method, env) { if (is.null(method)) { get(paste0(generic, ".", class), envir = get_method_env()) } else { method } } register <- function(...) { envir <- asNamespace(package) # Refresh the method each time, it might have been updated by # `devtools::load_all()` method_fn <- get_method(method) stopifnot(is.function(method_fn)) # Only register if generic can be accessed if (exists(generic, envir)) { registerS3method(generic, class, method_fn, envir = envir) } else { warning( "Can't find generic `", generic, "` in package ", package, " register S3 method. Do you need to update ", package, " to the latest version?", call. = FALSE ) } } # Always register hook in case package is later unloaded & reloaded setHook(packageEvent(package, "onLoad"), function(...) { register() }) # Avoid registration failures during loading (pkgload or regular). # Check that environment is locked because the registering package # might be a dependency of the package that exports the generic. In # that case, the exports (and the generic) might not be populated # yet (#1225). if (isNamespaceLoaded(package) && environmentIsLocked(asNamespace(package))) { register() } invisible() } fontawesome/R/print.R0000644000176200001440000000167314605637270014302 0ustar liggesusers#' Print the fontawesome icon to the Viewer #' #' This function will show the fontawesome icon in the Viewer. #' #' @param x An agent object of class `fontawesome`. #' @param view The value for `print()`s `browse` argument. #' @param ... Any additional parameters. #' #' @return No return value, called for printing to the Viewer. #' #' @keywords internal #' @export print.fontawesome <- function(x, view = interactive(), ...) { # nocov start dots <- list(...) html <- paste( "", x, collapse = "\n" ) htmltools::html_print( htmltools::HTML( paste( c( "", "", "", "", "", "", html, "", "" ), collapse = "\n") ) ) cat(paste0(as.character(x), "\n")) # nocov end } fontawesome/R/fa_brands.R0000644000176200001440000001443314605646413015062 0ustar liggesusers# Generated by fontawesome-update.R: do not edit by hand font_awesome_brands <- c("42-group", "500px", "accessible-icon", "accusoft", "adn", "adversal", "affiliatetheme", "airbnb", "algolia", "alipay", "amazon", "amazon-pay", "amilia", "android", "angellist", "angrycreative", "angular", "app-store", "app-store-ios", "apper", "apple", "apple-pay", "artstation", "asymmetrik", "atlassian", "audible", "autoprefixer", "avianex", "aviato", "aws", "bandcamp", "battle-net", "behance", "bilibili", "bimobject", "bitbucket", "bitcoin", "bity", "black-tie", "blackberry", "blogger", "blogger-b", "bluesky", "bluetooth", "bluetooth-b", "bootstrap", "bots", "brave", "brave-reverse", "btc", "buffer", "buromobelexperte", "buy-n-large", "buysellads", "canadian-maple-leaf", "cc-amazon-pay", "cc-amex", "cc-apple-pay", "cc-diners-club", "cc-discover", "cc-jcb", "cc-mastercard", "cc-paypal", "cc-stripe", "cc-visa", "centercode", "centos", "chrome", "chromecast", "cloudflare", "cloudscale", "cloudsmith", "cloudversify", "cmplid", "codepen", "codiepie", "confluence", "connectdevelop", "contao", "cotton-bureau", "cpanel", "creative-commons", "creative-commons-by", "creative-commons-nc", "creative-commons-nc-eu", "creative-commons-nc-jp", "creative-commons-nd", "creative-commons-pd", "creative-commons-pd-alt", "creative-commons-remix", "creative-commons-sa", "creative-commons-sampling", "creative-commons-sampling-plus", "creative-commons-share", "creative-commons-zero", "critical-role", "css3", "css3-alt", "cuttlefish", "d-and-d", "d-and-d-beyond", "dailymotion", "dashcube", "debian", "deezer", "delicious", "deploydog", "deskpro", "dev", "deviantart", "dhl", "diaspora", "digg", "digital-ocean", "discord", "discourse", "dochub", "docker", "draft2digital", "dribbble", "dropbox", "drupal", "dyalog", "earlybirds", "ebay", "edge", "edge-legacy", "elementor", "ello", "ember", "empire", "envira", "erlang", "ethereum", "etsy", "evernote", "expeditedssl", "facebook", "facebook-f", "facebook-messenger", "fantasy-flight-games", "fedex", "fedora", "figma", "firefox", "firefox-browser", "first-order", "first-order-alt", "firstdraft", "flickr", "flipboard", "fly", "font-awesome", "fonticons", "fonticons-fi", "fort-awesome", "fort-awesome-alt", "forumbee", "foursquare", "free-code-camp", "freebsd", "fulcrum", "galactic-republic", "galactic-senate", "get-pocket", "gg", "gg-circle", "git", "git-alt", "github", "github-alt", "gitkraken", "gitlab", "gitter", "glide", "glide-g", "gofore", "golang", "goodreads", "goodreads-g", "google", "google-drive", "google-pay", "google-play", "google-plus", "google-plus-g", "google-scholar", "google-wallet", "gratipay", "grav", "gripfire", "grunt", "guilded", "gulp", "hacker-news", "hackerrank", "hashnode", "hips", "hire-a-helper", "hive", "hooli", "hornbill", "hotjar", "houzz", "html5", "hubspot", "ideal", "imdb", "instagram", "instalod", "intercom", "internet-explorer", "invision", "ioxhost", "itch-io", "itunes", "itunes-note", "java", "jedi-order", "jenkins", "jira", "joget", "joomla", "js", "jsfiddle", "jxl", "kaggle", "keybase", "keycdn", "kickstarter", "kickstarter-k", "korvue", "laravel", "lastfm", "leanpub", "less", "letterboxd", "line", "linkedin", "linkedin-in", "linode", "linux", "lyft", "magento", "mailchimp", "mandalorian", "markdown", "mastodon", "maxcdn", "mdb", "medapps", "medium", "medrt", "meetup", "megaport", "mendeley", "meta", "microblog", "microsoft", "mintbit", "mix", "mixcloud", "mixer", "mizuni", "modx", "monero", "napster", "neos", "nfc-directional", "nfc-symbol", "nimblr", "node", "node-js", "npm", "ns8", "nutritionix", "octopus-deploy", "odnoklassniki", "odysee", "old-republic", "opencart", "openid", "opensuse", "opera", "optin-monster", "orcid", "osi", "padlet", "page4", "pagelines", "palfed", "patreon", "paypal", "perbyte", "periscope", "phabricator", "phoenix-framework", "phoenix-squadron", "php", "pied-piper", "pied-piper-alt", "pied-piper-hat", "pied-piper-pp", "pinterest", "pinterest-p", "pix", "pixiv", "playstation", "product-hunt", "pushed", "python", "qq", "quinscape", "quora", "r-project", "raspberry-pi", "ravelry", "react", "reacteurope", "readme", "rebel", "red-river", "reddit", "reddit-alien", "redhat", "renren", "replyd", "researchgate", "resolving", "rev", "rocketchat", "rockrms", "rust", "safari", "salesforce", "sass", "schlix", "screenpal", "scribd", "searchengin", "sellcast", "sellsy", "servicestack", "shirtsinbulk", "shoelace", "shopify", "shopware", "signal-messenger", "simplybuilt", "sistrix", "sith", "sitrox", "sketch", "skyatlas", "skype", "slack", "slideshare", "snapchat", "soundcloud", "sourcetree", "space-awesome", "speakap", "speaker-deck", "spotify", "square-behance", "square-dribbble", "square-facebook", "square-font-awesome", "square-font-awesome-stroke", "square-git", "square-github", "square-gitlab", "square-google-plus", "square-hacker-news", "square-instagram", "square-js", "square-lastfm", "square-letterboxd", "square-odnoklassniki", "square-pied-piper", "square-pinterest", "square-reddit", "square-snapchat", "square-steam", "square-threads", "square-tumblr", "square-twitter", "square-upwork", "square-viadeo", "square-vimeo", "square-web-awesome", "square-web-awesome-stroke", "square-whatsapp", "square-x-twitter", "square-xing", "square-youtube", "squarespace", "stack-exchange", "stack-overflow", "stackpath", "staylinked", "steam", "steam-symbol", "sticker-mule", "strava", "stripe", "stripe-s", "stubber", "studiovinari", "stumbleupon", "stumbleupon-circle", "superpowers", "supple", "suse", "swift", "symfony", "teamspeak", "telegram", "tencent-weibo", "the-red-yeti", "themeco", "themeisle", "think-peaks", "threads", "tiktok", "trade-federation", "trello", "tumblr", "twitch", "twitter", "typo3", "uber", "ubuntu", "uikit", "umbraco", "uncharted", "uniregistry", "unity", "unsplash", "untappd", "ups", "upwork", "usb", "usps", "ussunnah", "vaadin", "viacoin", "viadeo", "viber", "vimeo", "vimeo-v", "vine", "vk", "vnv", "vuejs", "watchman-monitoring", "waze", "web-awesome", "webflow", "weebly", "weibo", "weixin", "whatsapp", "whmcs", "wikipedia-w", "windows", "wirsindhandwerk", "wix", "wizards-of-the-coast", "wodu", "wolf-pack-battalion", "wordpress", "wordpress-simple", "wpbeginner", "wpexplorer", "wpforms", "wpressr", "x-twitter", "xbox", "xing", "y-combinator", "yahoo", "yammer", "yandex", "yandex-international", "yarn", "yelp", "yoast", "youtube", "zhihu")fontawesome/R/fa_png.R0000644000176200001440000000631714605637270014400 0ustar liggesusers#' Create a PNG version of a Font Awesome icon #' #' Get a Font Awesome icon as a PNG file. We can optionally set the fill #' attribute before writing the PNG. Additionally, there is control over the #' output width and height (usually, icons are 512 by 512 pixels). Please note #' that this function requires that the **rsvg** is installed on the system. #' Attempting to use `fa_png()` without **rsvg** available will result in an #' error message. #' #' @param name The name of the Font Awesome icon. #' @param file the path to the output file. If `NULL`, then filename will take #' the short name of the icon and a `.png` extension will be applied. #' @param fill,fill_opacity The fill color of the icon can be set with `fill`. #' If not provided then the default fill color will be black. The opacity #' level of the fill color can be controlled with a decimal value between `0` #' and `1`. #' @param stroke,stroke_width,stroke_opacity The stroke options allow for #' setting the color, width, and opacity of the outline stroke. By default, #' the stroke width is very small at `"1px"` so a size adjustment with #' `"stroke_width"` can be useful. The `"stroke_opacity"` value can be any #' decimal values between `0` and `1` (bounds included). #' @param height,width The output height and width of the rendered PNG. If #' nothing is provided then the output dimensions will match that of the input #' SVG viewBox. #' @param prefer_type Chooses the type of icon returned if: (1) providing a #' short name, and (2) that icon has both solid and regular types. #' For example, using `name = "address-book"` will result in two types of #' icons for an Address Book. By default, this preference is set to #' `"regular"` and the other option is `"solid"`. #' #' @return A PNG file written to disk. #' #' @examples #' if (interactive()) { #' #' # Create a Font Awesome SVG icon as a #' # PNG file on disk #' fa_png(name = "r-project") #' #' } #' #' @export fa_png <- function( name, file = NULL, fill = NULL, fill_opacity = NULL, stroke = NULL, stroke_width = NULL, stroke_opacity = NULL, height = NULL, width = NULL, prefer_type = c("regular", "solid") ) { # nocov start # The `rsvg` package is required for this function; stop # function if it's not installed if (!requireNamespace("rsvg", quietly = TRUE)) { stop( "Use of the `fa_png()` function requires the rsvg package:\n", " * It can be installed with `install.packages(\"rsvg\")`.", call. = FALSE ) } # Obtain the SVG svg <- fa( name = name, fill = fill, fill_opacity = fill_opacity, stroke = stroke, stroke_width = stroke_width, stroke_opacity = stroke_opacity, prefer_type = prefer_type ) # If `file` is `NULL` then construct a suitable # filename based on the icon's short name if (is.null(file)) { if (name %in% fa_tbl$full_name) { short_name <- fa_tbl[fa_tbl$full_name == name, ][1, "name"] } else if (name %in% fa_tbl$name) { short_name <- name } file <- paste0(short_name, ".png") } rsvg::rsvg_png( svg = charToRaw(as.character(svg)), file = file, width = width, height = height ) # nocov end } fontawesome/R/fa.R0000644000176200001440000002450214715741135013526 0ustar liggesusers#' Generate Font Awesome icons as SVGs #' #' Add one or more Font Awesome icons as SVGs contained within `...`. #' We can optionally set certain style attributes. The `fa()` function can be #' used directly within inline evaluations of R code in R Markdown documents. #' #' @param name The name of the Font Awesome icon. This could be as a short name #' (e.g., `"npm"`, `"drum"`, etc.), or, a full name (e.g., `"fab fa-npm"`, #' `"fas fa-drum"`, etc.). The names should correspond to current Version 6 #' Font Awesome names. A list of short and full names can be accessed through #' the [fa_metadata()] function with `fa_metadata()$icon_names` and #' `fa_metadata()$icon_names_full`. If supplying a previous name associated #' with the icon, it will be internally translated to the current name and a #' Version 6 icon will be returned. #' @param fill,fill_opacity The fill color of the icon can be set with `fill`. #' If not provided then the default value of `"currentColor"` is applied so #' that the SVG fill matches the color of the parent HTML element's `color` #' attribute. The opacity level of the SVG fill can be controlled with a #' decimal value between `0` and `1`. #' @param stroke,stroke_width,stroke_opacity The stroke options allow for #' setting the color, width, and opacity of the SVG outline stroke. By #' default, the stroke width is very small at `"1px"` so a size adjustment #' with `"stroke_width"` can be useful. The `"stroke_opacity"` value can be #' any decimal values between `0` and `1` (bounds included). #' @param height,width The height and width style attributes of the rendered #' SVG. If nothing is provided for `height` then a default value of `"1em"` #' will be applied. If a `width` isn't given, then it will be calculated in #' units of `"em"` on the basis of the icon's SVG `"viewBox"` dimensions. #' @param margin_left,margin_right The length value for the margin that's either #' left or right of the icon. By default, `"auto"` is used for both #' properties. If space is needed on either side then a length of `"0.2em"` is #' recommended as a starting point. #' @param vertical_align The vertical alignment of the icon. By default, a #' length of `"-0.125em"` is used. #' @param position The value for the `position` style attribute. By default, #' `"relative"` is used here. #' @param title An option for populating the SVG `'title'` attribute, which #' provides on-hover text for the icon. By default, no title text is given to #' the icon. If `a11y == "semantic"` then title text will be #' automatically given to the rendered icon, however, providing text here #' will override that. #' @param prefer_type Chooses the type of icon returned if: (1) providing a #' short name, and (2) that icon has both solid and regular types. #' For example, using `name = "address-book"` will result in two types of #' icons for an Address Book. By default, this preference is set to #' `"regular"` and the other option is `"solid"`. #' @param a11y Cases that distinguish the role of the icon and inform which #' accessibility attributes to be used. Icons can either be `"deco"` #' (decorative, the default case) or `"sem"` (semantic). Using `"none"` will #' result in no accessibility features for the icon. #' #' @return A `fontawesome` object. #' #' @examples #' if (interactive()) { #' #' # Create a Font Awesome SVG icon #' fa(name = "r-project") #' #' } #' #' @import htmltools #' @export fa <- function( name, fill = NULL, fill_opacity = NULL, stroke = NULL, stroke_width = NULL, stroke_opacity = NULL, height = NULL, width = NULL, margin_left = NULL, margin_right = NULL, vertical_align = NULL, position = NULL, title = NULL, prefer_type = c("regular", "solid"), a11y = c("deco", "sem", "none") ) { prefer_type <- match.arg(prefer_type) a11y <- match.arg(a11y) # Ensure that the `name` value passes basic validation checks check_name_vec(name = name) # Get the icon index value in `fa_tbl` idx <- get_icon_idx( name = name, prefer_type = prefer_type ) # Extract the icon width, its label, and its path icon_width <- fa_tbl$width[idx] icon_label <- fa_tbl$label[idx] icon_path <- fa_tbl$path[idx] # If both height and width are specified, don't preserve aspect ratio svg_attrs <- "" if (!is.null(height) && !is.null(width)) { svg_attrs <- paste0(svg_attrs, 'preserveAspectRatio="none" ') } # Validate the CSS length unit on height/width (if specified), # and return a number with the unit attached as an attribute height_num <- parse_length_unit(height) width_num <- parse_length_unit(width) # Fill in height/width defaults if (is.null(height) && is.null(width)) { height <- "1em" width <- paste0(round(icon_width / 512, 2), "em") } else if (!is.null(height) && is.null(width)) { width <- paste0( round((icon_width / 512) * height_num, 2), attr(height_num, "unit") ) } else if (is.null(height) && !is.null(width)) { height <- paste0( round(width_num / (icon_width / 512), 2), attr(width_num, "unit") ) } # Generate accessibility attributes if either of # the "deco" or "sem" cases are chosen a11y <- match.arg(a11y) if (a11y == "deco") { svg_attrs <- paste0(svg_attrs, 'aria-hidden="true" role="img" ') } else if (a11y == "sem") { title <- title %||% icon_label svg_attrs <- paste0( svg_attrs, sprintf('aria-label="%s" role="img" ', htmlEscape(title, attribute = TRUE)) ) } # Generate the viewBox value through use of the only # changing value: the width viewbox <- c(`min-x` = 0, `min-y` = 0, width = icon_width, height = 512) style_attr <- paste0( "height:", height, ";", "width:", width, ";", "vertical-align:", vertical_align %||% "-0.125em", ";", "margin-left:", margin_left %||% "auto", ";", "margin-right:", margin_right %||% "auto", ";", "font-size:inherit;", "fill:", fill %||% "currentColor", ";", "overflow:visible;", if (!is.null(fill_opacity)) paste0("fill-opacity:", fill_opacity, ";"), if (!is.null(stroke)) paste0("stroke:", stroke, ";"), if (!is.null(stroke_width)) paste0("stroke-width:", stroke_width, ";"), if (!is.null(stroke_opacity)) paste0("stroke-opacity:", stroke_opacity, ";"), "position:", position %||% "relative", ";" ) svg_attrs <- paste0( svg_attrs, sprintf( 'viewBox="%s" style="%s"', paste0(viewbox, collapse = " "), style_attr ) ) svg <- HTML(sprintf( '%s', svg_attrs, if (is.null(title)) "" else paste0("", htmlEscape(title), ""), icon_path )) structure( svg, viewbox = viewbox, size = c(h = height, w = width), class = c("fontawesome", "svg", class(svg)) ) } parse_length_unit <- function(css_length) { if (is.null(css_length)) { return(NULL) } if (!grepl("^^[0-9]*\\.?[0-9]+[a-z]+$", css_length)) { stop( "Values provided to `height` and `width` must have a numerical value ", "followed by a length unit.", call. = FALSE ) } unit <- gsub("[0-9\\.]+?", "", css_length) if (!(unit %in% css_length_units)) { stop( "The provided CSS length unit is not valid.", call. = FALSE ) } value <- as.numeric(gsub("[a-z]+$", "", css_length)) attr(value, "unit") <- unit value } css_length_units <- c( "cm", "mm", "in", "px", "pt", "pc", "em", "ex", "ch", "rem", "vw", "vh", "vmin", "vmax", "%" ) # Retrieve the row indices within fa_tbl for all rows that match the icon name # "name", using a variety of interpretations of that name (match on fa_tbl$name, # match on fa_tbl$full_name, or using alias_tbl to translate the name). # # The returned value will be an integer vector, that may be: # * Length 0: No results found # * Length 1: Found exactly one type # * Length >1: This icon comes in multiple types get_icon_idx_all_types <- function(name) { # Attempt to match supplied `name` to short name in `fa_tbl$name` idx <- match(name, fa_tbl$full_name) if (!is.na(idx)) { return(idx) } # An `NA` value means that no match was made so there will be # another attempt to match against the full name in `fa_tbl$full_name` idx <- which(fa_tbl$name == name) if (length(idx) > 0) { return(idx) } # If still no match then there will be a final attempt to match against an # alias name in `alias_tbl$alias`; it's important to note that these alias # names are all short names (e.g., "vcard" is an alias to the canonical name # `address-card`); canonical_name <- alias_tbl[alias_tbl$alias == name, "name", drop = TRUE] if (length(canonical_name) > 0) { idx <- which(fa_tbl$name == canonical_name) return(idx) } # Nothing was found return(integer(0)) } get_icon_idx <- function( name, prefer_type, fail_on_unknown_name = TRUE, msg_on_unknown_name = TRUE ) { # Get all fa_tbl indices that match--if any idx <- get_icon_idx_all_types(name = name) if (length(idx) == 0) { if (!fail_on_unknown_name) { if (msg_on_unknown_name) { message( "The `name` provided ('", name, "') does not correspond to a known icon" ) } # This is only in the case of `fa_i()` where an unmatched name # should generate an tag anyway return(NA_integer_) } else { stop( "The `name` provided ('", name, "') does not correspond to a known icon", call. = FALSE ) } } # The possible use of a short name may result in a single match in the # `name` column of `fa_tbl`, no match at all, or multiple matches (usually # 2, but 3 in the case of `"font-awesome"`); resolve multiple matches with # the `prefer_type` value if (length(idx) > 1) { exact_match <- intersect(idx, which(fa_tbl$style == prefer_type)) if (length(exact_match) == 1) { idx <- exact_match } else { # There were multiple icon types available, but not the one that was # indicated by `prefer_type`. Just use the first one. idx <- idx[1] } } idx } check_name_vec <- function(name) { if (!is.character(name)) { stop("A character vector should be supplied for `name`.", call. = FALSE) } if (length(name) != 1) { stop("The number of icons specified in `name` must be 1.", call. = FALSE) } } fontawesome/R/knit_print.R0000644000176200001440000000437114605637270015325 0ustar liggesusers#' Safely print any Font Awesome icon in R Markdown #' #' This facilitates printing of Font Awesome icons within R Markdown. #' #' @param x An object of class `fontawesome`. #' @param ... Any additional parameters. #' #' @keywords internal #' @noRd knit_print.fontawesome <- function(x, ..., options, inline = FALSE) { # nocov start to <- knitr::pandoc_to() if (is.null(to)) { warning("fontawesome can be used with rmarkdown output formats only and not knitr only. ", "Icon(s) will not show.", call. = FALSE) return(NULL) } # these formats support inline svg so use next method (i.e htmltools::knit_print.html) if (to %in% c("html", "html4", "html5", "slidy", "revealjs", "markdown")) { return(NextMethod()) } # is the format supported for inline image file insertion ? formats <- switch(to, beamer = , latex = list(ext = ".pdf", renderer = rsvg::rsvg_pdf), docx = list(ext = ".png", renderer = rsvg::rsvg_png), `markdown_github` = , gfm = list(ext = ".svg", renderer = rsvg::rsvg_svg) ) if (is.null(formats)) { warning("fontawesome does not support this output. Icon(s) will not show.", call. = FALSE ) return(NULL) } # icon is written to file and inserted as image in the document if (!requireNamespace("rsvg", quietly = TRUE)) { stop("Using fontawesome with non HTML output requires the rsvg package:\n", " * It can be installed with `install.packages(\"rsvg\")`.", call. = FALSE ) } icon_file <- paste0( options$fig.path, "fa-icon-", rlang::hash(x), formats$ext ) # icon is written once and file is reused if same icon is used several times if (!file.exists(icon_file)) { d <- dirname(icon_file) if (!dir.exists(d)) dir.create(d, recursive = TRUE) formats$renderer( charToRaw(as.character(x)), width = attr(x, "viewbox")[["width"]] / 2, height = attr(x, "viewbox")[["height"]] / 2, file = icon_file ) } # Pandoc Markdown syntax for images with link_attributes # https://pandoc.org/MANUAL.html#extension-link_attributes knitr::asis_output( sprintf( "![](%s){height=%s width=%s}", icon_file, attr(x, "size")[["h"]], attr(x, "size")[["w"]] ) ) # nocov end } fontawesome/R/zzz.R0000644000176200001440000000053214605637270013774 0ustar liggesusers#nocov start .onLoad <- function(...) { s3_register("knitr::knit_print", "fontawesome") fa_dependency_obj <<- htmltools::htmlDependency( name = "font-awesome", version = fa_version, src = "fontawesome", package = "fontawesome", stylesheet = c("css/all.min.css", "css/v4-shims.min.css") ) } #nocov end fontawesome/R/fa_metadata.R0000644000176200001440000000404714605637270015372 0ustar liggesusers#' Get metadata on the included Font Awesome assets #' #' @description #' This function provide some metadata about the included Font Awesome assets #' in the **fontawesome** package. The list that is returned has the following #' components: #' #' - `version`: The released version number for the Font Awesome icons #' - `icon_count`: The total count of unique Font Awesome icons #' - `icon_names`: A vector of short names (e.g., `"npm"`, `"drum"`, etc.) for #' all included icons #' - `icon_names_full`: A vector containing the full names (e.g., `"fab #' fa-npm"`, `"fas fa-drum"`, etc.) for all included icons #' - `icon_names_fa(r|s|b)`: Vectors of short names within the regular (`"r"`), #' solid (`"s"`), and brand (`"b"`) groups #' - `icon_names_full_fa(r|s|b)`: Vectors with the full names of icons within #' the regular (`"r"`), solid (`"s"`), and brand (`"b"`) groups #' #' @return A list with metadata for the included Font Awesome assets. #' #' @examples #' if (interactive()) { #' #' # Get information on the Font Awesome #' # assets included in this package #' fa_metadata() #' #' } #' #' @export fa_metadata <- function() { icon_names <- unique(fa_tbl$name) icon_names_full <- unique(fa_tbl$full_name) icon_names_far <- unique(fa_tbl$name[grepl("far ", fa_tbl$full_name)]) icon_names_fas <- unique(fa_tbl$name[grepl("fas ", fa_tbl$full_name)]) icon_names_fab <- unique(fa_tbl$name[grepl("fab ", fa_tbl$full_name)]) icon_names_full_far <- unique(fa_tbl$full_name[grepl("far ", fa_tbl$full_name)]) icon_names_full_fas <- unique(fa_tbl$full_name[grepl("fas ", fa_tbl$full_name)]) icon_names_full_fab <- unique(fa_tbl$full_name[grepl("fab ", fa_tbl$full_name)]) list( version = fa_version, icon_count = length(icon_names), icon_names = icon_names, icon_names_full = icon_names_full, icon_names_far = icon_names_far, icon_names_fas = icon_names_fas, icon_names_fab = icon_names_fab, icon_names_full_far = icon_names_full_far, icon_names_full_fas = icon_names_full_fas, icon_names_full_fab = icon_names_full_fab ) } fontawesome/R/fa_html_dependency.R0000644000176200001440000000212314605637270016745 0ustar liggesusersfa_dependency_obj <- NULL #' Use a Font Awesome `html_dependency` #' #' The `fa_html_dependency()` function adds a `html_dependency` object into a #' Shiny or R Markdown context. This allows for the direct use of `` tags #' that refer to Font Awesome icons without having to use the [fa_i()] to create #' these tags and also add the `html_dependency` to the document. #' #' The `html_dependency` object is created internally with the following #' invocation: #' #' ``` #' htmltools::htmlDependency( #' name = "font-awesome", #' version = fa_version, #' src = "fontawesome", #' package = "fontawesome", #' stylesheet = c("css/all.min.css", "css/v4-shims.min.css") #' ) #' ``` #' #' The `fa_version` object is an internal object that provides the released #' version number for the Font Awesome icons. This can be inspected by using #' `fa_metadata()$version`. #' #' @return An `html_dependency` object. #' #' @examples #' if (interactive()) { #' #' # Create a Font Awesome `html_dependency` #' fa_html_dependency() #' #' } #' #' @export fa_html_dependency <- function() { fa_dependency_obj } fontawesome/R/utils.R0000644000176200001440000000026514605637270014302 0ustar liggesusers# @staticimports pkg:staticimports # s3_register # nocov start `%||%` <- function(x, y) { if (is.null(x)) y else x } is_na <- function(x) { isTRUE(is.na(x)) } # nocov end fontawesome/R/sysdata.rda0000644000176200001440000155752214605646413015174 0ustar liggesusersBZh91AY&SY%< `RE7΀-28€k@ (HGm+@m;` tw )Ҕ( (޽Bh `(P` Ҁ (4 aфh(@@$ : @KK}ҲWe^&F}B% }`P$DU+e-HkaAwz4@kN(z=>]m 5` RE}/f=hPP^V)@Twl'!@>vG6M)@ 9l\{U(A"׶=:˦G+Ϸ&"ϣTtn,:W}$5!@jD F֌j Pͳ FDLK@Q:d ;V(ݔ0P he9S[eQltvkl aS@jm#F 5JjBр@HQU@46XT@-`UTkB0܁UPETKiDAQP4SiZlѳ(:E 4Z$9QAlѠ1 6gh-[j@ hf8PD!ִm[`4FKER Diդ6i*( D(HjilvXt.ԠD@k (CBCT f@JA*u`MhBD$_ޥU"H^JSףk5;4R{q-rѢJl(ĨUG[$KmmPAT'Da#+Sе`+@іf0"b֧lJJ=좀Jh*{zR@@G@t*zvǴáTJQAWF](2 @;fH$M(*D6Yj.uyڽHgzu[Mí ̢ʑUZ+Bu.'t)=ةOw;t8T E"ZlQ]h""JZ|^E2 *k.SmafG;{m4 2jWm݂pz7llҔu\(T@[g@:tF` P*$#sD)xuUӽ^COYqۉt#5j룭֓m-s ڙjmC}U_lҸjww;jk@|m `PKCZXM*KB԰iFlQ Hh(&X=yMAQ.vYH7WZ(2gӻr  ::>zMT $}ls 8vt} >K}ϩs(` o=iD<*kmUm>[6XE PєW-Q^v1B1||>[7j((lLpYf>v Yzy<P)TQ=R O@H! O 6<(fz=M6)6)hdh$TFOIL!iH244`d4ɉdM0CL&F@L"LT F@HB %*~T@h4h !hiڦS=dLyzLa=L =F<i6RzmMibjP!40ST4PmG@ 4hؒ@!Y A/`$ADDEb$EAEDQEDA`E*PUV"*Eb*(*Y)R*u@)AdQUEAH(DX D@PcY d$B,E X I$Ci!0MBMHm $ 6$ liBlH`$ L`Hm i!$Bi$HIƐ$Su;>=c>C^Tʰ-9UvTCW?տdOxrGF?Iϯ?(ߥ羷md?@1E hUDQk(֌EVVV*Db)V $F""UbXV("Ԫ6AZA,()Z%JJX F*6(**(*(TQATA"4J"E[aX,PVP mډh*5TQj+ Zhm[T 0BcJUQ,PR#"KmAVER) ±`Ĩ)XDUbUaH(,Y*TbҶR("Qa+%bR*TE%bAAEXT@PPXTY!REYUR H( d)\B* PX(T%dPZԩQb ,VF~J"tO,_ҤOL~ߦ=*yOzdGYhlO&SW_)v%Q~ޑP_Ncy ]a~SUcSD"k>}4vrx?^Z;Lk|=}rv$~ӿ鿛~>"M"U L1 "Qm1b"֬"ib*"1Jʊ(TV1E#XUDTUTEQccYUFTb(PBm*ŊQZ JLjux y[E\}xҧIӟu"S՗ _.Owq>jn#*ތ|oG:ޑ>'?t_DK߄7hzC;w%aN \6Xuw'ٿ$M]0o8㣞zo>Н^ր'?R1- ~%v:BC9s||w${_>o791Ϗ_}fUʩ;`et!X7oo?o4Cyb~~Oa~_O~<8Uxs0>{+yv^™oSەXο[XE&#!9_;~}sI;??vFVs_uXOX?s7xOKvۚmڇW?dXC@sw!/<<)>)ۼ? ]A61 qܛ?nJP1⺑TR71o[a) H[cO+<ъ}i6e ')7)P"?SSV= c ۉQtJǕ}'{h>cZOQMGu}Wa e8笪 7CI3駽i2~崆_ω|*Lz?;b2j[n_̏gRoN~O`cNSMc&>sҜ]lX3}֗yzy|d1)|ňH8ʪ)cS =mWm!Ă==GmkRFa}yo_=7#Gݙitgk[dr~ۺ;_yQo>s랿χ|sx=\>o u&tr!?]8%>|p{=;U#Jr[OĈTKg y?#!Un7 ^}]?mWV^~3_khE؆ELs/W;Ͻvߗo?OjX*8e֘jDy̕PՄv2b*[;`2 ࣠,޼}UI_%0רCU9^Ξ}2<B=9z" Qgd%~';Jm}1Dyo6o:vW3/sf~oՑNi6JgUEKTo|LM&%*K} ')@PyʕS+/߇p_}S'?my1bO'FoWmnʦ?o!T^gbҵlʭ\!l"S~ oouyZ2!_3:Os_b=T˔m?)ʥ3&>zWAvj9ϲ}r[_#'$] {Sw+ƇMUds?COdw?Z K! ucWqR~77~ńB+|CoL̈́v>=A"L|[Q=`w>_fGP'{>. {CYl%~&> K! :So"~ox!ða%U'CNAW2_ChBuM-+"𨿃u ~tz*'So>)O_1/G/z|RQOShWQ&1t?v>zh}U=Jq\PTʡ>K?_y|yvh53I|xێt>շ@vѸUs n-v{<\TDIG1-qQ׌͏9Tu->3/!>?a'2+D'҃|][+p-0]̎\KTBw3` _p@e`n"*'! wh~Uʰ3eVlG^7az''M[?M/c#ZOkpg=@Bsx/HGQvFH3{y-g UK+avm$I ""H@" m! CH 䴃IH^$$HH";ܒ@"qB^RHHl(Вs(B!D"BBP6ߟB DIL@')$JRD {6$V䄐JN0ךbAtc$:Ԑ4Yva:fk t*ClI3 KI@PI)2`LRB&2P$DɡH&M)&BJ`"dB4M +RBdNI \RIWctlR u{6C{,hk@jkI! 0$S$!4h!JC.4a&Z!$ei]2S^iw:\/%Id(MQYL@@qS +gOLp)dL< yff$ (v\6p@"E "ƉrWTQ{9}ޤ;d3}yׄK8sv!0dQ$o"BBӹڠf PȊGX[t$adEi ,y_k$ʕ*`{'v@ÈxdS5yN#]0U8@Ʈb71@"TXu57]zhj!IG2i I$TLZܙwŢس,$  " gKpݤ&{j"ɫ gr]J9j`3g6ejRbB'qS0 h $r[Mbi ۦ&4m.0Uxp;[bQws f!LuR,mV5:f72LaU9X+Jk'P1 \5RG8kmcl t*GQU  S(`0`N򹁜HDT ŌtlD &C|j`&q86oۈq=,и˲F́{Y)uRҧ&З7iiBjDPmVV=Yc^ ȍKa$Bt(̛R$hp7[!VPKD\ZpdĢAP [e1ȐԀN&^a5mw$E ` I 0@40LBi 6 $!bM`d0$h@$9ɤz9+ fP"՛gO=sL5f|' I\"fvT@+ ,M㋣=\V(i=cזӌ/K'77_`[nsN7 IˑBQ#8Rcy{KKNRcrRPu7zf\(H7a:Bn;ᣅH1=`s+S\x|7VU}A]`" 5L1h jDw.-H$ru]!熆}ٕ(@X؁9n 9XNÊb񽹫CTl]:RI t=wn` jQ6o$7E,Q ,Q v%'\fRJ.VyA%0̥h|*.Ѩwc44;[&H: r]]GOAXrr"b` 4q76hn+]% ޲Ŏـa$f $֊W] Z=4 b0Y.mFHSl"mpv 3Q/ȇ%G7CHyKߞ`@7 ̻BFSA9x U(oi7ex!ұԁ"GXMr[6î%ؓ+}9_gML5NgQLt=8:ŝoVĜ8Q҅ BTNǠi@0 :i^!\`fٞnRs{bM鼝=xܼ6:tv@88]-/pPZ0pi Mq/Ptw`aJ[Gq78֎y3Z3<\y91$BP(W(8陼ˀ` &G8mEv$Za e3Pe.kZ̚7J˺8&[҉,) T/H!ҠMˬ3Bԓ\lPBY`DM_1tH71o0 :jCDwN M ; g&sJ P؁ٝ62jh X$u ܆94X(|Rʻ{KZKP'\i9XVZS\3Ac;wnJ_;$j9tXQ:RXӣ"L֚3k\\-"L6!ݎB3TkwWuyy:L z.Ecs],L0 R:5 u<4X*ե0ʽ>.]BE%\zUʝcVm܃3ac:rRѴ'F-uaL $M(nW!|.°e]8SZduUn޹9z4 #je텘A|-, "VjioG |.f]J %t#ORuÌZs46fllrITL ^0Fup#R62D;>&cnq'xBB( bMб`X܊2q+8]u,a-v@P̶ERwLm.zt;b^陛AIU{HHtEʛY 6gTSB 特Z{+rNb35a x'ev  o:$ 4ʘ@`440I4D 0A lw'V"n\ֻ8k Nww$ 8#!Bw=jS}K^ug."*2E[MbK Y&d{=V9҇n@)U \jJB<$*͒2Xۖ'`Y;t! mmawYBQ 9nvNԢ$*+1] 9ĺp'27\䠉+8Pݜ6saҵ&Mپ#9;9lPi;Q̊23gbpΊ#Q`J܍"8:P,VUBuTh`\quT  ڔ3/To; Iٚ5Lɬa%+7*\E2Q [A@͙$aǙN8aCa.vLOL^oo|SFlq 枴Ya:SﶃFZ$Mtt+H3Ue UVIQ E@$!ym *GQwhHջ y`H]Ր|HcRض$+ H X7I*Bsd̄л؄#ֻQ5Y`%#rA^UHdlH[xb(p=V^A-.BZ5auA^M<0-uTg7g zSXt9Aŀt**D(dLᑲ 6d6֤#d,0vs{,Rr)Ȭ2ei"tr@Kut#x5掩멝uwˁD,ؕV& ɳMj`sF܅]*[HbT"@-Yh 7Vཾ"*t"u4 aZΪ4!oհ[.fIDNn֬|NfmHŊFъ EUkFQSgr=ݓTAeJ!Axln颍jX{U,pBX=9bʱŎ"g* !F`{eٓ â$V۬̂35fm]9ۆY[qn+!dfh5/4ç wHt*Y8 yƈ':lHˎtnfgEU:j;;ld0qm"p4"G Fnwmme:6"N0H%"v4Z iYIJYӀ` ѝʤfl g>hK; fmsV.KFP 7j 7T :Eoe@,xiVo3WRBхgkm3()X{VY7Cǀn@L{; okD@xrFN+tˌ6Ӽ^lެT\ݩbJ˛+::f(J S$k6JdY\"ܙWB؜(5ؑĘ4gdk#jx٧k=y}:H(M 9W[I('sPƞtO34@Rwulq<Sk:í91Up/y_pʋI]23mNt n_p|v(NP(Y o [ڣEٓ/DyW`vuQU.d+z:&NLƉM(W)%1`SX1*@;` ONwhym7O&PU+39`NI {ZJR5h]`l'(Q\'"BvU\rX჎1qmqeoXB Sp"8p9Ȉ",TFUXU7kTL<;FldpUn6;ca=Iܜ]1*9 VAbM\Ƚ ssi;s{q]\S^FXԳ{A LBGTCz=ջD l@!UW{B8-ZȪjk&*ciGF.CeW5wfny]Xڞw B7™׹p2{:<$=|p9ޞO@8$4IspVr Ll[$ҝ0gDjKtrErօ<':˼{+/:yBvfgP8Ϋg:٥Fd͖)6tum9ś"ySdeR/@맂˳x{p0U A2J5 AĄAd2(H,2 E@*K s-ai+ybXٱu/,|vj`=2IJ^H LDD@0٧A^M! Q@i 4Ćc(J!4 HTVYBy17(,I5pjKF*ƗL=vauӓf&BhT8㭇*$V.\^7ۛF6,`HLH3bu(НGCAe-uVs.ӌo@*Mfy!f.D%^Q R $6hXL$3Jw,2䉵q;{=A^\V%< [;B]B.YGw;uwSw rA۸.֮<Ө KɽNgW7+YBfw*rJP;I4Aӯ+S*'W]l[vbDq 91B;t,O O%55|/UcS;˘)};ֺU Ƥ %;`(zؐPzn*p-BWLVg-wp3J',wGTsPP3xm $ePG d@֭mp"ȉ0g IL&4sheƊOm]Z:r.і4[˪*\t7r=9jvc;0NJMp(NN8-QLH[@`Kk*leA6yik F)3zX؛{uу*6yaEEVe/`8$+$\kt 3hr:1yMz8 @ldedA`LshBʝf)a;E0YN @-'I1`/ 맴jbV]m18- )!PzaJ5q4ܼ;؀{ɐ97KӸ6yfHYkV)W]w髃sn^-O؋/UPZoVnM+UUGwI۬ܲPˇj+a--] @@DF{7X :8a7Q}w5.Z ʮzT#g']AQ61% {閇dYz.A_^;Im1CzF k1jzVZԂ8`Zoa9yNMM,&WXbUqwEWyx2']8hQ70 ׸umDX0;tSwۨ E+D f{Tj""+Neޛvp0oU<56Νt'@2_WsaQDR&f"ֽ.uP$ jMY7-s3NpsckEnt4wt*9箫dċŶYuɜx {Usy2Tޮi&ƃchU9B)[GX"O1D<ьxp7+aB&IJY2\Gt/"nKfw #0T楡gBbCX&v1ͫj,| -Ҕ#6fGSHc=KX9m\fp*A&@4 `\0UDE'7CxԾnDT3K .c^6xQqD+&Ek01}_Q!6i b% 0؎QPu]:BTɇP@ a@  .R}tc K3:ޡX2v1SiP6[G\L]3fBnzrlS,_N IΜE{*יcb։ueҐ f-DP ,0wz@ɻq i {Zf]`}U.ZEn\M82h ҽYKE'D@[Sji59C1[ 8^lm ʣ@Dmb97[qNGOE0e-< ir oB.2fSp` uȱZ'ͺ%bJ8„臀 تU;۾֖;XG@[{YaL,ajMb6-R L_S>HaPR%h#ׯغ :׀~."~}otNE3)ŖIFWoѯ\ohʊ:|PPZQCEFV9 5$Alư5ݓ/=Ej0VM$EPzϸ0fXmF~WMXDEi(#=?}dMb~SBϨL0ޕ"c=wW/J7ƺ>_"4b=!_-"!Y5hIFm?xAr͢~h)(B@N <t/ MXi!1A5S[2¯~ |^D7nbi\Ҩu:- jЅ^JENJ4=,gWqUA3+a⯅?p8/r`>h{z1ZT $Ϊep{#$y@:|v&P*]ѐyпaccflJP'*6j!*\~o7ӞO ,6~M8Gwn}(GXcf2m!^r.%7v,{tBgժlE*ʸtbK¨Fm'&qf CIz;'#o9X%U9t't-Cބw~}_ҫ+(XgZHN 6ZOO ƜU{Uʧ_Yշ#Ɯjzf@@9JkD}ap&WlS^-K}R Wť]o4CR6erlHX6-5ȵvZ*l=()>Xzma\*ӫ1x6h-9S\3K΄:onYÈ\닓D]n/6y'cϝ&SF M<ىU,8B3gڔDVeO~ŵ!WX?.EH6x~- ̌SFCRݴQ#A~BZӋ6T^XxVɛ0Š) @nkj_BVVIKx(" ʛ'TX Pjȶ]2 jMGOg62[#wIgEnܜ/R1bF邳fBiYpxZ3[3=ށʀ{Oe N 42yK sѧފVP{:dZ5N}rq9*M~nifyb)P֖Ƣb2bvĒ pZUwB4s?V73](ړU0нmu1å-qKad!҄tLU uk3oڹ0GSX0Bʊ"?<:<" ؝Top7P|i݊#Pmڨz 3;[^xZ<ZIJW0.NH|*t\yy`|u |ڗ֪kR=E_z5B X_Y9u gkȞ n]ys)Fmo(\EW"BDk^1eO}_)Bǚ\Y AFB s "oɐfkp&f 0[kap@ޛRyyjD>n qMAl&s/58a"8xuÓܦýGUܶT HX:P$ s%e[7up*`h&r뒺YTajˬɞq:@RP$C"g6z{սR/\}1E1 c!K~,#mv oJuCc%;;!PBJu(٠i)pU|o͝Ng yvf!,[b\xE?r*ya }s|~".4%Yn#Ķo_ΆVy;u=W~˷gcJrP*-wHuOI;ڞWf8ymPh"<1[j;o9P E3r d ɕ̫F^Vd_~f(mx#|淞K+Hݲ,V$KlrxjLyL؇@H^,"MCKĽ"b1Mwh7twO!iPMˆ'1sJ!E7vnMT>ރ.kVncQuVU}%6qwF%Pxƃ^7 |,&w{ Yn9xzv o,9BQ}R8%m_ "o3~q !93Vu}NOoznEw^q1dz4qsA`4 ՁYx~1lyxekWQ4/Ⴓc.CId @ivpt&-"R VbQE tKض?~h+lRyٹb1R,&:fM.d5nRqVh]e5G7S8lRVWGZ,FS\Jcqn7ZkKH6 ^`“Ti#k&UiN4[B&jS`wI:VA.Y9a'Ź+6yӺ  jw.Ʃ  . rFL̀櫄oHv<Hg!F49]+3?^L0Ul˄4T\&Mc("QDAD0bŌDVFF#EI6l:䳃K<7;`"0bDDEF0b `B,FBE[{})Q{sp]tAqNlme"WqKbhVuL/燶ϰ}3x]b[#5y\[ ]E K#ȑefĭⲁqiz{ػƝS Z+ma Gd8 E# 3{m6Msb7 *[ Y6&ӳ] kU@[}A2cBbG8T.):DAE^R;ۘx@xjs-y!Z$ne޴S\ރkT2 z\}SM\Qa&`#Pܢ"^i ~uyC%/E!/dצg4vNBANY=xӻ33"}Ny\N $FXДcA&! Bovї-2L&hBLhNx>@0 HJI>~לiX-ɇjLA~eEs#`I-"f +@! BMC zw΢/*$Co}#^LQ)#`05Y[D:JqAf4l1q,3H=j-Ubø3`Hܹ;'{A QJu թ`U-sC7%r^uW2ZNL%R66Lfy j|z@ʷ  X˩w!Gw\U$1}{ا\&]Q*jgGlN_D胭6  m]+i :#5XFJī2/YQY)GUÕ#!57_™翠A3IF"/FG*&ӡV}kB䒞xj =ws|H0QBoqsdO}V] 3@bWrc o:ɾZ.WwCTW yC5:r@ENZ|6bexzOA oamXʧ* e݉MrT%`J$4VA"FGGZm6t:@ka~&Ӝwvق$3W˛¡8 rm\ HuDIޡM\<ϥLߎ%oKqQ7Vm ȈT*o{yT LBACv(.(F 13rp"Csrf@lRD`@4z#]njNBvVt{\Zk䇙id[Jp" {P\5ikawcO&qߋ\s@Qnt XzW @hqA፝OYm.PE}ϧQ)5|vELn;, jLߌGA:>D2Dz~.޷ ] ZڗhwU4bb$nZB椴-ĝF2VPޭ轤knj4{/=BhC.혼xh7A[`cؼC@v?\}8Dzx|%@k) +(EwNkyzkeRc~#/7l5v>ϯCOQؼ_Wr' vs%"4|\*"^U1Dw,X=:܋ɗH^HIEX;8tav"oR ոEPL 65֫q&wﭨC>~*`3@zX{ފ a>y+c[ǧ6RtZ,7~'BiWʉ LuK?hj~?&ʚmS6F_sn6~Ntc^B؉$A%Ačذoц[hΛFDU2h'"!L 9뚺!9qB(:WUa2$ fVTv{Mbª++\uv;gPȩ&{R6lDʤ!riсb]oy6qiiw%bX `Q 2MҾ]mu.yɵ[PŋVV* tms`IZ h(#2.{M_ M@AADnCmd͉ w˝x ́,֒)@~!KƝzɏX(rP$]rQp1ʻoo KoycoI!k@l58&r&H c}Cka=M#k1Ӑwq+XGˆ0h 8'xȀzّ$0ák^ͥA^綏|VN:k}TE6_j|cz1QZօZ`ɆXЖ2~F¯jꀜk=Nl4NBr{^}{w!J NY ,FfsEh=06PM``'瞯W?]јۈ$4eh.0]ě7a9nn\2j|vxuSYñ)]'AfuA\D[5=nbVKi;{ D@@o >]v#9`ǯX!#LU陛+|W4!U&V*Ir߿x,# :R=W'$]q nZE x5C7hLB%&><}zz mܻ} PLIi̳\Ftj1⌑͙ȉDf )b1wNzKՎ.3zQMF }DH$T뻔;K-u;*V"L4w{eb,X^!qZqS%/g!7F:& m$挊r4Thګo\CpȞ  xsapwU\TR,4*&SfUBe |Fn\]f (H,rBNtΊ "d<79.w&v5dDmv뿧S_!A# IKF;L[RpE#īhT6ˍ kХ5@̖VNcJIHib[LYMv ؔrKO[sclNod|P׈"[ ̭g*"TFۆu& &p2 6 - P] FVeي V9cA= fƯB@LQNM2BgOң\mdEHco>9hD 'SU\vm֤+†C=̍elD,UH09(Wq#rc LS$[J߀#FǀuZA 5!TCx(o1Ӌ|si%!^ScDAljPX{)O05SWC@]W|GgR`xhCDFiw{bLUkz pB̘Md|b Mrlޗ@e1mVAgݟ CzHmmm54VMlvk-4UWSSmb3d><Q_@Wi/Qʋ"J<˞l7P{$\i@2:@ T]lGmnʧ8*kPH@/JHW߁+~Q"{/EX˖qPgĺ/5b-A{C 漆1b72Q*,F9TZ3Uq__3n41HϺ'^_t 6X&#4qL[3pŶ8 Ux(ߵPC}[CY lc !5X  c#~pLHgΰ_{eV_Fs @ kdue1i7lXD"3 f (Raj ,;ٔ.ŎbȴJtZ8-t(\HQX%Ĩ0FcN&Ӹ{pNw+WvdѺK[uB<[@K* nc#=p+DBC$VjmYB g28"8TMODnsW.Q%˜\eDUyfz mPλM;)(5 @].*w?Fwm8^&T@0lӰOUБ{#4e&DD\W $ sq]uȶuhTKKk#M`ψF`;S+T1x<M!wvx^a7~x県NmL[W%bHs4H}zX`((ҔG՚g=uJM_4>׈ _,"ĈI1A",E$FB|98 @Pj`,"/ٲ B "FAHe 9~Yh]R"A*"PF 1VDVH :K; 0,$!bH)# 9d( F2 #1 "  "QX*DSpaރ5 [Ni/k k^-`|g`V$13MJHK;©]x^&@4#%ք-V&#E#18j3x}bqf{hQB ,`1$Pgߗ]Ku祃UM!i5q(b(hhd!&!$RBOX2]Phe+nay l~P4Y +><>7"$g PDx(@DmFફdtZh-$."UV@{=-A&/s,]c|n4 iVH![tCjy P4w=| hQ0Ydۜduۍ[KF` PSF h\](8eU-UA⇅rŇػjvcL Ay' ?YVY9.DMZ⯬(MN&*qJђt^ä Wx,7N6L_N^f^w^9NQ`]e(.}Hc#@h 쌓~kc XY~3ZA7,"? -=|{ *3ǘW`n1d'Z5s➹ {y-8hE:2f@0"K Cj,zVv|9Q) -ܥ-6lGkb`_5~΢!̈68έFmhqI ڎph8%t\C&iTYnB ,<ȭ!m@uk%!voz nۨAehEߘ^ط8lfR\ |"sr`mV1_W6C hJ, h-x1WG A< Xx?rrՀd]tv9x(핳smQ*$cW T:i.}OR¯Z.q |Rؓn㷻< VW6u:wEhR63$&3<.hZh0 Gn^wX_.k<:,pZ^7bN QX֖!gU$9Uō؅ ӼUnh?.a29hǚ0f̥X0gN\y tۯ਩cԊiy DF &:I,;[Ph:qBDmci;h[F\Kx{z 2܂W0FbT`fEHz;sCƴy>S~xĹU񃩞mpCMja$Q{["hC"н O28\]nX(bF-o=O7=po؂2ݢDX}{ܻ޵O~{L$XYF$R/+^ Em1|*}#7{t=Ӳ(i\BH깔O!$+0kDmY<:QoK|pRmafCI6\7 >BcP#(u[#a|Wׇc{]Ml hyWC4OrgK UɅZ@Gr%&kǭϠBSoȳ=Cm&/uYff.8HFX#Am`,U)*\ͪ_BE n݋ )]姛}EG0>QL57"j%j9qmxqî@'a$;ӓcXs~H/ECmط/%-Džw= zdIu5)Z$^?poLe4qNQk26͈J#]A< y ZQ>p-.z=>]=xqʏ\ODs!{E*ggxgl13uuP" BD(5Yà*K#ZNS:@ RM̺ƕ {u`Vq͸Tv`rujwizN>0iu -X{'{]S _ܮ*Cnк>بXZO+DGNYLj ͡th֍ 16R y\xOG}Ï5<]M wv&g'}<5w B@ T[M M+AReA"j@ 9@Hb%R۽k-\](K*z %v霽rS!67V/%,0Zaps=@e1G4|NyB:֭]rC#*ҞL">!3v׽ *)EJs =߉L9ͬ GS pd򕋽t>js3\x7Qo{%zAsBp4,ߛG,u,i @`QE*-[([/͇=gڞugR Po*ƸSkY7-9Mp嵕G9[;t+jDžF+@/"q$еk&z4-nUԇ:ڊRrÛiJŠ\Aံ>Lo PSgn|=fxW7KѠ-L[^,=J"5a`9|3t{|ekDs^ 2'@Kv&^(xw}FZ~CMt{nƕYJnglZ06 NUx+:2ojb@aN [~-Ði$#:U $Fh-tĞ&HᆟG E@젍ЁKUO쎣Ȫ|L|OH=>##qHa 9lƂVd0pM[tJ4^v:;cw3K1m dA,_E W/?GD>'a}^ɾ.{bfJ*`=laQ e=3ZODug|"#8DbQq{ ⤔&E-3}Mr68ꒂb d4 {Vb!v Vqdpb_w/T냘u63{{iSil`+ 0pKض6΢{B`i&N:;k\ڏSEﶒƓ23VR;kM:uvÍ]tZ` M16tEׯ]uj,h㲞L/U픺h|!gltɟKKX]G'=ڧ.b:"Kz.&qmxc臢y4xVRa} 3͚mߦeFZysTD]M.חr.ηAFލ *]TzAj𘅑G'ç<{{ťٝb[x>\45ŰNi9!EPe0 g^s5>rt\AG|tc͠`|ylP֪;C=hHpQc£MѰѹ.F8't K[LkXm$[=o[cb)dFRPv*ԫL~*ބ(A֨FVf@C* x@o&`ȩ$FƆmlpU|m Dh 5슜eh|^Gx̰M~ Q=[aqqn_Ƨ+4 2If;\<9r*nr僶A8S1ćAZׂWkbŮ;ٽ8a{[GeW_PR2m`}CWX W IŒ |M͈ izLpk]O?wB4Ҁ ٙEe! Lx&_ch@5k[LyV<BF.P-FW&'x G6V)HhT2/ܭ㎻Mmw 2zY:Ue`f0E+*zYvD 9bmN(FWD5=M%*,c%lQKy\1}DV@v{BNF1Bos \C-w,ǠV#D634$ZqE'Vl?~7̉t LJivA:9͑۸3yj'{\]Y)iu%3@Wn9U~Bcex n] , j]%ܻMN N/dϫ[ƆșTB1W.Xn4h(M&we Kdj }J >S1ơQrߚa[`CXr7noDPACP,XYugd:m XJ~"jqJ*u|mvΫEK{9bb"$ b$ `!!̄ YS=uo!x u[R$FRȰV#H<`0DCf}ފKx_~+鴇E?_~f`wwC' Sw^}')$^gP$9ݚ1fǰm]|U#X| !G-%0 w|n\Kس#coYrDG$JN@\t} mMi(M qYQE ?gn'3|/) IsZ{U0oq2)3=H34\W2ە`qe궵dc#2Y1x F v*qiՏFmX *YcAMa/w (iBl~Vkw!55h[Ve/!AR9u䴏!GӒ:zU.:g,Ws%v*!cV9qb. Z㔚۪#p ڐuiwrCme!Jzb֌PTBjČ7uШ֐!P*p~Gꮼ^ƹLG8dֻWvE#!vttt@9QQ+ev9Yjuc"(1 ft7ڿoő0'e2*w:ssLM^\uL߷s}X;Ӽ܃}jE܏^O|fn>ﲁB'޾>tr 2( 'r ZfEWۚQW\q4?tQq@ƶie nmbό+@HgW(@ZwnP@N{E(Ȟ ;SpAOO(xF~@l~}ǘڈN{|?J>Iy/´R|[BxבjʱkYCGwϵ}-?0 zV154:yEJ AMm;1Kw?~N6[ӎD's:L_O<@2@ٱ$Jie+ hwW%/W"=2j\9bs?< tE%֥U<+9|C?;$0"A"RP_;r[6#)A'KST 2Ny8['h$(D "dC%4i.{IzDcWwNn-߷{4AldF`Qd+Ts+z pBm@CotU>5HfpA `T4w2Rx1 c]z}q4kjg~b۸ o'x*cX Ea!9X򤑾F&3D'qsrjBpД#q+^"f ,"Zt:)V~3]\\|N it u`sFY fVHqժ ˤG)R%:>zWV =L"'xc$-jo.=WYNµNveBq#4m#0G9q񆡾~'a hK8́9'88 ۴23=ND4&eVL] [tAWh)uX,G7ŷta`J&J'NhXjh*wն" hs0>v7kV7h`00{$\*k@PD&MgO+EhtXnu2mCϵV&hn=W'X~2e̩ `I \%+9;{YwkLvh&(j ҦT:Oa+;s$ap %^\nŜSw$ n9$d#֔&Ň]gZf9KPHO0:0_Kf2IIR67K؆B ҢP=N !_>Q Pg⿦.9y0}(4Ɔ:R-46m3yȺTp"J&mygnޟwɿhc+!~*@0&GRᑝBc!8v\xhtZ AP&OJTV)(r0i vDJRjQ60H3Wqsj 9=*I dguuTe@85CF%i v0؀0N 8,`|;&FxB200m)xXI,%>bDYOvYd 9y/M^8j =׭f]۷H{)}Rpl JRdO5KQFC HV6N@t'!gЇ@M\{n;$:3iZ>Ȏ9rHp6}X`J:@;>% ya"z>EL."㟮O[[5]TN,Kt"3JY`g<;VY?!LT>gf&91k96l{|ՙhD(b`>,٣A_Mtlٰà9ņtT({hтhdQ?Q0a_ON˖gMF 4MAFK4"=-U(lz(Cрv:AU”`3aCBO,>>Dv¥1wvIZYVp%%~'RL;]sYR<5P X[pA^]PI֘h@An*I2(33<0n:\t ^'b*  xTh!7Xma"!000ARTcyiZ&6Fp@U?&CaU~F 803TWC+>j\ik|ΉB|mlNy[$B%= R`bg.)VXt1mh2zW{- ˵b0JBg*SlC&˼) 1qP~>`߯q+٢fFh7'\s}p3}BӆUpݪ,ST K*ז9r]sHB- …[۝rRanBHۜ;e1s.@`W2U: L桖M?e[9 #ECɈp"<+s}dzGdjBw:U[,8͡ґBVv0(ܞլqk`D!hi,F;˚.!?Uapʮ1F!_~jfr22yvO91tD (1O/]ݣeNe#iӡ\3q!8ǚҖI yg?_\okL) L/0S(LcZ*L_šD#^=s: U?R 2g撣m*Dh7 n@ ~߰HuOu9ȐuwߗY :}n?E4]&Hv$MIYX!XS\CUe: W`t{ z'="aNs$ P&,4-u~Pd/8r.^ vx4e LF!ج!@** ~Xо+4a(1G8Q\pFu rkÜ:(Ң֯L΍z/۝zԡ!H2H"s9/d[ÓZt4^v| o݅/{<=FN:b1- CU!goog4PCKLbuvw&qv }+TEjs7-}W9:U_!OQ-{Ujwbx6ݪ8*nLe>7 UUl&pd`s[-SV^aK+5' Л4hh j<(Kݑ3nWKn1[3P4$$񟹿hSO#} n> BZЈgcՕ~ڼJh ̣ŎkO\!aL97bH|48sNz{X,z +شlmNKӧ}mOP0#]`>lM\_Et3 ݱ:*2:'@*(9 MPĮR~fC@ceSC삯P5Zv=⊔%Ϻ}"I]ټWmegvX(r E Z7-xxq#XvlV8pG*]+fndHqa : r4YInܸ~5Z,jg*OgZ ÇOɭ%qũkzT(ciF1* ݛ䞌dUzlɊ8ks^RV9)/jȼ2l AȔ2PW=D!9 JbG!>Oܰar*eW~@qPτsq22} s+aP`hnq^TjCE1]PBf$*h}nqxLk0S nE 6 oz,"X{;g3/BĠvSa7쓤60B{I$<QSU> k~!6㨐$bh`c^\cN_@lzg'W(>`ΜE"<.A_?b3m3dzZ-%`T;^\0$8hMC=S2qdy;`3h(>0'0,!)n#wa QZuubr;#׸6ϘT$蘫1VqE`DZ [y];:BGVê =N'lYlUրu" ݃l=&_@+ vdQJYM6WoQOOk)Фlȱu)*fމ`:=Tlr4N,eN7{Z<繸 *Gھ"PGhۋyc*ԇ9,[0mM\ | 6a"J,CmcyCאRzLy7e^4k!/+x. Cc+r=%mP*ɒTAr?2`,V0e; [sb'Us}#]$R${NO)f'U5 : jUkZvJдeb*\{/@J I"ͧ,}x{׈R M KVI",s!&׌Ɂ^r7PG:"/k3X]x 9f*͙V$n~4gīkƗd"V$ݰRH9] G8e37 жR=jfT6duf6 j>awIC;< BZqM(P@(Ν>Vz>hãݺGwgٵ]_eו+.y亷 &3ex\ӕo^ ]TX;[ Lژ 8,x#w2t@wXkF5`JK ^y=^b|PNind)H(.'% B)>D5W,1dDk/;0oU(rn(Ck)C#|nFw`Lgm$ )iȜ4lȥ{fcҕpI3]oC]SZ^^dYihbb?]Q8 ]G;G؇n &_WNR)p}w쟜ϧ'@S j ᾱAJ]ʱ95+ֻcfP|W`n:"S7M6 Vd[J+" T t!̺Bt_uLX>T)!-z͠ԙUOg$3Tʅd?}*{o݅w(ӔG~S!8l[۵6MxOzcm׃٧:)jK~;&%ҫP*K1E S_l.ZSc3#l2ːDrqwAz{;o6_rJg3jRqyq dβ~$Z};&,5s> ~u$ ګ/HVS!cyl6Y{n6*bҺ|:FJ.TjTD 7{LeC,uF3KhL1sNUJ |EsoDsQ9le oѕSyb*'m-@}N/wJƳ.|Sd.w֝V7sҔj̒z|\x}->gXB<`(Vyjh>ޣs9~u1P 9˹hWģS&(CEc\6YH[;t!e޻n*Kv(M'Z 1t>Ro]@~^H9FDLYv%O'_`lw[sL{^"\)؇mãg8x''h MڢpUkhe$" \uề0a4'KQ9*.dRa1Zkb4ItV'HUWKDK  55: ݈v\d?biw+9x N=aNNCߦ<;mF76`2h } |tr9{'꩓yHH YH/X0=X_n&NJ˱:.̙Z{]=eoPI1ZO]zf0fp1UM7Q[+RmPCEuT !Q>sUc[mFWg ,bӈr=|=[~9ByՐOO/lHY"Y ѷ^ +&=ڧ\hjc}y=v(ULd^Y\fV:\2 -ٰԚ;il5H A}9e?;/åU6YD TCo{2eIK  wi%_b_ Sﶍ}bk*ghM0|گ!yvwp_at5C3ڵȨ{;ݶZC i=B⑈,$ٿ 9ojScoϴ#G U" DU|vnʿm2|$c$=2*\ֳSn]CSnqw1􋸩t},@ӡsdĭ,O-ɇׇ4qy2Y%l{`{^ҎO]w›tzw;|``̤*qR:I/ -8[,`4TC=:hy?Be!pe1r0IH|@b" ~:jۖF/HBE6΂1 FxE3^xS;嚪&lw4r߭6:@+j.J}^)jX$ Ef?rr$W^x@=ɵ@ǐ52݁z/k g2:$nfNBɠc]llwkne |J>E;tr+tER$W%ܣ6@ci.rEB Wtpt%a bA Hiiu@2݂b|&{Bj#$zV^ e>nT M q="0J7[ xuaM(z©x '9KZEL1+|1.+ R! &u$gv ~y @V:_a >'h_}1hfrBWdaa9e$w"M4x>azFK :k;wݓ;ԡL|ك^ zCNPHHZrY ɾ`: 5)oeB=el+sҊ9oROX 7r'd=+rsUjg່/zŽMz#ӓdXd/nUHuWI O}#Fɸ^*>gHZ>R3;< f;mԹQx[(^jv6eV aWBb6{w9u륃˼<2fTa:(An̢k#;UL8՝溦1遐ޔ.b{ƭXȎڻbhfS|yMk,H`gb鈷rAʺ؛l;1mxWZ7 *^eMUt%s+@ӂp:po6j)weT*Ɋݪƀf42{ָz |_yז#!ON8E\=w+w}}|e[ 3)V&r$[{=o{3|ipB!w#u)F  ~`n]EkHnRt15.ʹ I|:g79*.''޻4?v5! Df覺 n qJtv*<nXq.B?dLIXKQB݉dU btR#NTnYyCp$$ (:9ٍ*<CQkZi_seɆ.F]dU۝I7ۻp5rʞ;}zY_}G͚,eƹ|{B7gP+xFָY6!(V2*ϕ@l0X|W`Bx?7Ez;y=0=! _r)}WR> ">ڧY9z9gE9қ/-ܼAzv}rpw]ت՛%ZbowqH辻FGH5ֽaD0C>ʹM[s^<8[!. WpRR^`tΜz/42|a2- mMW}bM12Ky^R$A=3(7Cᛝ5oW[o2`ql`T֔I[œyJJRI%Q  L⚗F)mVg֪ܥ =珨UP–Gdֽ ࢰ:P62'#@ou wۭyvy* xXs.>{z"gkΗΌٮ{w]ʬb|a!z2آ_6Zy$3r}pVc)<:Wӣ8)=F!g<[ ՘( BQ.&` 'a= yxB{]]nVXC4On]Ӯ0-[̺oؙd^{-7ڮqO˜/7xsFSLP 75AGNC)#m 6SM;'xthzϳײ|0s(!ϧ<=w7U͋vCנe5"E*D]]M݉7;%_s},gLt|+jǕ/CR:ҤV''-+`^ߨ^a"24q95= f heTg^aXVSW^qJng2>h:ԑ~6ŬwCo{{7።5$Gz}x^zP]U9?nHL]UK'%.ѥAJ2i5 pvgC&ɪzqÀu ՠ2@'v e ?M I0KrEDF*y74ஈ9;HY;戩Ćd@"f\nK  n 26i`U#nsj#ÍWf1L!FT++_?N04*nMUwOzzܡsaF!Ny9:Ω6)ȊY-dَXeeO0"1y0/ɇyD ߸|^oeYqb*OA~[I̙ ',W8YXdYg N>}/٥c^je!54)aWa^; v߼swÍH;€DV1;Eja_V݌kvsuwVSS gc:HNEعnU`]&l;1}胱h|9 n*g.nN*=9<23u-WT!KI[L1gnSIj{ 1Я"u3Y^QuGM%/f .8B^: EA갬@O~nrw;&Tb̛5\d1 V80L9/5Mg ũqh & Ɍ$bÿ 6Fgch6hJ4_ۆv۳"&wk}[߀cÓT0Uϻpme䱇Ow@S53rŚ5y: yb@p չ.x}o.oM!8HG[n{pViHaT#Np;sTa4aՊPGmT#@SD@t=m7W[N!48lm?~oTjݭԆ $Ca m?&Z9qc˭F ֟Xd]Rq̯WGƼ⺰=Qq$uŌ=7hٞ_n wٜD<=@A{ᡐ(EϾLB1\A:Dm%o1,<$YTn2҅:N۶pVjL?$x8Re>̯2M|F,> @lvk1p{BA3-^f 7*niMX/tx.Ilǻ)5g:T!79Ǘzv.}WTQDrM 3DGyH::eQ#$XũWAT8kq55+qz;@CBX9~rk3N1jy DDsݡ-T-Xܪe޶Grf0XfxI^VTԺ.aNx&h|:!$&JH9Ӻ|swr< yQ>fI;ucm'ļxCX2v;vI/Ѭp;24@2yv޺v0LCBOFon}+zc+"G Vn@ g{=ypFALW~^<MD A [r1qCEf>[4e5C2,KIS^6f j֜7:1PNwBEJ{22R٢>pr/{Ib{A9@c8˹Z2V sLQoI=239 #}kܪNz\r4eCBl(t^F67cAm2_0AH]pxz;:]zo9!zG-'υK"ȺfbeIMoz4+9@P`oGsɪ{ׄe%]ҾsC`z1f$͈ m85DwѦkQWI)U絮ޠվ9jOTۢ jF!v軶R4nPʬwsz‘Rseɺ4 2*WiC SY^~gglz~_J=]0gTɌ97"C+8l!)FW|YnqϱĴ؉9GhUh;DMn&އ7\IDfvRGmᝡ,$F !TY%ZJ>׊ÜՂ,ܓnM{shEҘf5n-x8wX-T.g6/GdߊBi S։Gyق5|N%r=c&\(B\ͣWlIۺ{m{7AᾌuQQ6$WUx%ޓA^n0!v9m\^˗WOuD3Gf7Ht4sBgwq56qDh],*͙Bjݛ#k"E䖁5{rū`i}$];#ԞW_<8VFWX[ C$cP2+|pT.ˉBɪ m:$^=2q}&Ո9D3@{~;y_Q>s+Ю[r `d:ƍNL{).:1q|cc!D {u+7mTgÆ-1 <؉24p7UԪ@5~l/ ^Y[DzNCij+U*vT9W]1㮐ɺPXϕnbv4',^tu_4Lݥ08׸i21wJ"'(cz&<ޝƎav 9#D)0(9 jC PŅk8bmA9xbȍw,nb@auy6 im$BiQJ[T:@lMn}csHRVd2 0hIIP'ʨI`1ZHͦPoQ,X+/|dV*R,r6 㣍.7z%do-5P4HnP!aҒ@bL@z^weaMUu[bĀ&ov_0JM]ic|r}2u𨻓pf.쀣]RֱKR3=ȇ4>'&M!X呐&h:ޜ]#Q'/kJAM5,NnD;ӌL EPB Sv!$B!J{n@t >rTvƅ* A lM=#/djv)M^UXOo`=wvk3uJm^~Q xL~O_vRoe'e]frN)eT\R4`(HS3^sN0<;yd$r싮dIDv"C.a5/.TzP >ȷ%"!׻KzQ) ųa.8vtvرC:DX"Fdfl}Q2_e6 ]g^\Lc1Sp^=/y6ڂw<>[}vsH9r8XBc (~4FѾmT_VȸYxud!-ݾ3lߴ+953+=p,&V!Qlܪ dͥ<- uY9cvPU Y{~^g}5 H͝}Ң^.}35gEb;N_~wVAtCV-P:n$T!']FeS /* pof|m>]ۙ.2M=&Umó`9:RjyyUp/'lF:}1C=[Fvf*`{[ʻ2ͫ kM fmAM1]{kx~}c8}T\!&q{滛JkT2(\xN* Wa8R;Y#C"T䂭Ğ|jMV![)7 a1]]{֚?xW 6WƬTwm S^/hZn=s #VHS֊jljI" C+X#YUlNK CpɧfdHczT@z1*DC*Aڣbl 2]zp^3.PFp:*U,jƂaQ+69/vC]RmɬyLKKY5dŌ0J[vRw!-S_X Κ!. ? ^`8Lރ!TTו@kwlPnm[0/4 !f0ƧZ[؛vUSDo_*:ae$> p,bsxZ#m3Bސ#Zs`2uzD5t*˛bnݜݺ`w<جlVյ)S>X2=UN.!Xg2ud[sS.#j5!Cdl΂'B͙>["Wy#N 1_]`\6Yݿ:=wGTNtć0:evgVB 6Foރ6D'P1RO@.TZ~IKCN`80vBUsCL:}R/i\%oYN׾^aOya뮵!/ U:w{C?$(!s&] Ƹ7[H]R[_:n'1SdFdfA Q.:iT!ꭚN:MgJ>Z8C;dM$VOg` 4w,H0]Qwy~7w5++'u Tm (E WaM>UH] }/=&A-'냌꫻Lve*mHx5 =()-AR55zҭVj:lb!&3Jm`HĴ7oҬrIƼr[vEؐ.k{O ÍjA^osgڨev20e0)U`Z˺70>IJE 24*bBꑱ3,!h2Ku/ xhvl߽5sǩ\E49fvzѹ[bPAE ܄rIo)Q$8!Y <;%jS2H$b'_(HO˞OTn Hœg4amCEVeZIS;\޼zrLd.udf}XѬVL.Uvy!=GeuP)i΋wY]3= j/ *jVde)ؕ4HcHaqDQӁyUkenM%uaBd@A Dɐ^=ҽ[C.Ѕ0ag%4}_33[ޠ9[֙e]6`Xș[emUn t}ϬόKՄ,ɣCHz$52/&8:.DmcJP1 Zv)"`hi|Eg&oϧU)80:[\y*)RF99<2T[8E¦.G<f1(O$IJXEI~ԾQ4UDBGׅz>]f4>[R2o]D긌@S?p];dUbaLb;+4_bTGq8tv(Q4_ 7LǬ5Ҭ@2ê%$ݎwB+vO ` Ҩ@(=7]0^'GVKX'wFV] "TCnW,5QƅipK,|gٺĀx,{@`_-aOZ'TZQ3gA8s(`z`и_*enVFzp&V@}X5j+{^,; o)Q ,ۆY3 6"C 4YPClͰ*ZUMM(;)9 @#xDtrF# U}:per`6%x9r=$IXgoX}Nx27%h&@y(xN@j^];zS1{VbjذL1N8Cs..)T1ܲpI-믟yٜ=U~ظlj]r8Ȣ·٘`j|OP.mLV*м偍B2^d<0jbㆀb'9u#"6/˻)UV@6\. \}:6Stc;dwo.8 F#ӱyN jc@sqfuNEhzC~G V*yuib^|j[75TvXiU\Ca@P~ @w63A0IЮ ުad<vy  Z؈ 1F\rENH8-p|h*$qXDɦ0gV́zIέ=! @rrC4 PO@LpJ18} 8t2]+.V|`ly d<5 IExN&9w>A\OD*UEV{3:y]I dgr~43|uxy%w6yN ]  =t!L利j]*cftT`.}SlZǹ\5 "nɖ׻4GDw?-f$=C8Ķ&AS'mo/ lTwFfmb PW⠰= 7uld Q7<,ͨv5ͭd#8 ]S[wd΋Z4)(nx/# 4?)|dS->6Een-&S,ifE&S[>]UOgC÷"v`jS] 7gbntXW0 =< 6_ ݧ}Yk`uVRi$eU5S'" W8 IzC`}q&RZ0$3D~(FsWLMzJśM>XN ]1CWe`B9w('(`s+7lྺUH}1|8ml{0-@m4%R,a=yjk) 7n']Ef޺E ;FipcJbtȜWap[mN|2{e62 1@Oso9bVNԆ+;j+ꬹJe()kXt4rl|9)rW6뒙:Vl NXɂHĈ2 C'$`3ahȺnOsO!0N&Y ˾PuՕ2宠%Scͽ {vVC3Qu뜇\qbXnCWi dO7'}-F3FH! ݅ |tz"Ñu/T8ًQ Y-Y"bDE}XC3QyY,kn,8kZf7b/)Ԋntl^ெbbsVztZOmxR"V n֬ɝ\ y Kt}3 bf첞֐y|+D,lu ob^d"EZEk:΢Bv(VRHXkRD]bgt#{Z-*ezq(#cNTL۽[GbB\i2b*E ~G'BJ,m\^sеsS݀8< a=L٨)bäJ1%qLlkRry)Ћ]hH'+Dy\s#.*Ћ>Ä5ǧɡ8v;ey׊Ni֧MKyTFx4˃OCB"AˁRVD%ME2U)7|0`@cZ]xEtP BbםYhxUm3i)s,e1E(t_Rg/B f}lG4%Zabl>GEy>n`#bg iF^ړ9V-zkxH<=Bʂ!se+BcŘwr.xgX])j.U8U|GԐ|]#(>UmCpN>v/%@#weA2EܴmSz5!K_b${֯4RBƩ\5|7zt׮+l2ox&bvom N@s\& D{!pQ0z'$GR\ga>c*:ATmǽJ`OJ rXs/E 7 Ors%!KS'D.0uY?$-X8a[P*6ʨ6("cҤDlȔokH"sײvd$kaY[Y,`bײ\n#4` l@`֣Gh[mV 1yݯk6317&n}w<B.M_u Zt-VcR! b.wvYYmfV9 eXTe!ps'%U/uE!Sov]Л!/>*˾ 4uᑃHas4q`7߾٩$Y@);:qA p2 G[]xΥ2Q̗̦l^82:d8dLfwOrKrР ;ZDme^,[ VeHÆI@UulQxj3;w4HWZëWc6.vYaRna N!4И櫖3wh5[Gژ\4;ؚLqVDa(Mh t[ qSO3La5Ol׫BL;>mv H6:H:hfm Z ' F9'cS3Aln]֪%Gu릨;a8|:szw|m]>j' 2"^0f%sL}(r5c0G^\.6ƝjZl]VrklIT` :Y|>^f*,&:鉶]nI"lJ=k) f=StʠGJ%nɷATy[{^6{wA9J %^lɰC0:UƸ0yTa{p2`i艶-,Pt3(l^lέRHr;(wAT^@@<5Yi ^ފ@Аz̹W~ViXZy/"h f! RT9ds-R-L qriz YԍlNc޶7apD@ޚL"؁H/W҇_4+>Yn  H7\mrm!VR8 ͭG~/y`.!(MS2B;@E奀 IحG֨EyE|FT}R/gS8uMf 83&zNe;71x :ԅX>WʳdI6`:n[|piy썉\W{$v] Ϧy9KX ժ~U*sy Q:R@x3^tL5jUz@{ј"B5E$bcw_Ǩ){nn_`FǤ`xѭG8U!oQ/^rd16@_i7$ 3?Z#3``cCD۵ҲHf^ٺ _c5n~SX̺.@J8&-$Un~|I"zO4E[ON_W=8(.D 甲|GA! Y?$|ѱX>7W`^>L9 {fˤBӛoAF[٥z|h9*"h!3-'fYD[F/K)ٚ!VxVT@1 K& ^@'_>XoȐ+OZ?$cpS yZ4 I`ϚXecA0QH,B^p25=>"ad 4$,%o<.Зx);kh#]UTRzGx@f!Ug>c<}8>mls=4+gAM.[?s+6Fh"ۀ 6 ǸZ\hٍZoEcxx!vh;h{9fnF3Fq >T{sAr٥ձ)gXsK t-^bgZ?\;`Al*BuL15Rxtھ͎!-&[Ux2 jfM1wTzͨ٫ ] ]2 0zOq wõ2@$@S>>Ow{4E$XN:'(tg.|:`ɢH20@Mi[g 8Vj **hlɕ1~Tk)ԑhUGޟgҫJM2^fªB[]^v;@.ؚx;y3f,cr5eHuz2_@ž/$OGYFQ(x\]'bz)d=gJZ]!s+j1~2ph"t=`!]kW1&ȪTvmb"+} KrzYq{<#gP{Xr/vB3#DR-Nj-UT͊V,cpfgYUw0 o "5ELjjc&k/MQeAgvV(i'fepy+* ͖7w7__uv@Kd\bP{^ա,@I]I&&5N rF}E$Ac 2^} ZQ5|,L|ᅓ-We6&IT#CWeZ2۪k.~R3̿7>#j6;,쁙toOcXtC'kl__˙`pS~^ȝ]<8wz:)q3Ͷ'+5R?i$cfegGpo$G!c ,`=N7aA%4Ą"lyv* ?w@ 0:-C1wƥfaeP IXVfF޷: >C0zTuXHxY0{0Qppȗ\ = Zi ( x fl]ʇ:qS͊( xf s&SG].Մ\ ϲ2״;>S:ZALgF ͦd@"GS?˜#;!(L% _ @s MOj, `lpPۡTEg5:P)p+#xPg꠆@@Z2+DؠѾ8iOg\䭿k"N?Ol5B+9Ȉ`-%ȻX f)I߹O>mBQrג5LZ dMm`"q'aUpP uNƂV6TV20ɗ`LXWpom(B7&kCYls\6-)g;|8@9Ȯ8 !!hԗangQ%emL.-[u {Ɲ\HH+3m p S:GO=ND[51R[Xm_p\>3-ӕX/~["HUW]Fjkq0ϔ=uyLt Axݓ@QM(0@Tjs Z;i;C{LDtG ̰D8L}2515+Kq*3l&l'FuhΜzkV ᪃A~Ɯ~w=Ճ@Op) 3"ԜbʩŴWWzfAIݸ:yje@iSBs'3V'nq \ﬤs=d53Nۀ;G^9e;; Le4|z` 8wDmΩvi5va ëdzk& 泥0}ذ^WI=~Ia0|#!cv/3 6[)+ m!jٛ6}U=~ubc8]t@T iM!y{llBv9E亦F1E5 r̜d rWPi*Y|skcU$L@}&;.:xP!ȩTAHue#~ lrHO{syAT/W[)gD3IȾHlsuBLT*z33Q97a1T;9{]pOD= p\@ 0] J׮Wx338ixٍ&&8*O 'hBڀw"(Ks3sBM3lvO,nstfx|zqB]S}eu=n+VN />'!$H>WzZsOOq{J Z  yXw>@kYLOMǽ*=ypυg5џPYZFaCɝdZ·za[кF:)521PLzΠ[Ezug^uQ]d LN wn|Ur2-Rݚ=dǁ̀=GF i^0ℊGڦKЄtU{֑O-VHKC77ԓ;"(qsP`qf/DDC@XiBUQhCssOY}8&zm i+SغTCB]E%+P4nl{s7rŕƽx@}Pr<웆2CLKrmp[ZIA38xdQ79)LUꦗ26Z9θB$F,rəQ00((Ug6>5G-x7Cri Τ읒 t鯏!JN;}` !VL,ak{ìm-Xh xCG&c#jE(g0Umd*=}@ϝ}+䉇WLLm+jSYLpoVu殦SD_βiSaD'KgtyZ;S\yg6걃 '( " 1S|vPy֟szYC 4V ;u~yMI0|x @ܻs6S#9 dmU td ŀj 8Mr ےA$9>R? >h!p^5]Ch60 f%uP8 DȲ(r v\Z~fc[qlP@bC Wީh&:@."|Ix)gǕ 2rDOܱ!ujH'2Ã'02{.T*=dztI$J4cҚ1y뻯v:Hmhܩ~=0fsgoY":ln޳h8ެޟWXŦ}WY7Eg|$Tc92"ӇlFD}%y^e F6K[\kKXu5\dI7%.ΑzUxf'e5C5Ag̩ y#(bG=g4{}Bklcy+{ywVg7g;Y2= &*A:hhw2@BUPf|#yTɑHNgyNcus=(;$(+o&Fc)v|V$.R }GVf_pL_ ^2Й1s=w4*CEĐT2m9yrn[#6 Őt_f[ o$yFqh#`Ta۰HO+}Ww%w2 dAH|i䙞C6kcXJM\WuJKltVYn*ޝ&JܸIYd3]2X8aU!ldgsw;c~_|6/DK7MKT91T0%T" X0qjS8-w箳,JY\ _tV Tp;ӡ#;.mk~Ws.Kg0=L" lM+%_Ql/iRF(}h *Swg0|n]+ohBʕzq^1>ib6|"<&Tb$=OtQ , $ `{mfrӯtC lܫ ,IBHFuYcH (wul̊ M}b3wBu7ׂMV@>{ >I8[q>_V9v"‹.) a YAs Ff}ϳ7Ô;vǟ<^$,ˡ=vICVPx=Y} Ѭa}[Oك3xnЧ1'럋:Dӻ9Ya*78GS/yxV&ϼg;\ NV0&3TH2p`e[۬DM~e*qª [yA.2.nMgbd/WPCٿ^<1 EYӗwq!i4<ᏻ\=tP͡hg('R/sُs>s8ZA[3vkPcvhAչp~Q:eK7%Cb}Z- [TpL+J"A˺d 5 bj9zvµ3xwfPA.ǵر})}hMÖ[3 km]oJ/ЪӻK@c7ٽj{7#>ZˋNKS& 6  0@Fi\_#;D%ԍg!4hÃļl_V2kCUn<J6}0p"4j

4z3\Y,n+`^R UX_\4~#9M @<ɠ$YW.-5-+Nl@1Z/08u}k% *Zy3þnO^ ho)PD RہN@^ӡ%2&uV㐶 &fjPfeвX *ue n*3x*\8dN, d @h xi\}CϱVOl&͂ꥫ\" "}/0Hw.@ޚu49BbX2Nm8zmEe'. qAzӮtCZ4G`1szu.ҥ :f!ґ%m"q3u ʕh x dV`z+9zv'LRZabVUf`-ogswܻ42Z} @b"S;k\SS'ХHv+O| Dا[ fƋw,t̊#i_|Ї t5zwk^oW7zglnMfKcsPQvdO/6ZDh*64pL܈VT.ݍcYa_HtDlO,Μf9t <ۛݩ^3N_Z` >c}q7"f/Fd;C/{}Y \G^AV@Cw B@Vlk[Jz^O>7P}f,mA6 ;"0he,͎sC~3<=0 1'_gbT_>ؐmnR ,v=7]TP0 rLx\MЪ'!毯)@,=M 9([Thve͑Ӑ&'*|ݍxp4 H1p^@}\b-г4284@%n q#]]Tw28΄xM@9~ %HLx>^IsGOU^jFſlPq}.Zqtԙ5kv:om:8fXq`wή 5Fc* DPm |x:$@1۠8dG,ѸC&]pUrǽ8fؐkik.Fn=y;533)/,҂sBZ4'M&M ˕~Ԝ8do{y w-T]Z,qюI#y|`3ĺ^Vwɼ 1Z$eV*vrd‹6DsYh z&7kCLOGbƺv5;c77 . 9q !&e n3N2Tr|K!*VtRe0uQ]( Sx27L@kM[5VvDMk{Z 8>sшUxdTMӧA΂f_m{$BH7u8T*s(nUA=Fi[s`nXދ*,5Jc׻YW e jR271d]q֠o8zac[XśL2o 5coش;xQN[{D˛mmEkY=kѠbBN*mPn=s[e_dX5n AAeخ>[TGl㗛P||ڥj :Q}BROtlʃTVV;2:]QIOLȇ!eL=gaǑLOLhQ ^=k=m+7J<# 1RmQ@UT^t3fFFIW.. %Xؑha6C#fr b((d07sc37+LBdDȋ2b[Zn =/s:<27p1$wgOW;sA3:9+\¤}i;A{ /UK$͟Om?4mVoZ.ʻCGpJ^Z}5 nѯ~ϛj`He5"̷bՊ-qxaKS&O]f3y9b̬x%!$6t<\vLEHmUA f^G/HQ!<ûYr a7\immT]pe 4`2Zx͝49%m:= '#(W"d2luU;yn:Ӕ laW^\ܴy v"vq"=ت׋]%gUD8`l8\M8^W[eS߻, @>WG&r&Wj1`{Nn0i(O3bfQ#, ߶޺R_*2|ǹ0),m}^eݦxnWXj*2L>YZ(M@4:FTw;CLUOHͲ`F!zAX%wMB`1Di 3:.F>b%|ȕ،+P\]Ó7`ϭ'zl/ns`YܺuLq ׺ij-vrook6G>8&A:G09W[-^ڟ Kz 5=` nJ5˷vl⭄Xs[eȒC?tu/XJ婶ķt" *! ;ޣ ^%w-u%co;k5[Ζ&\c׵Ӻ99XأNAx1xw o}74ڛϘ=M_ k|yf+.*_KBfT]NXFv<1$CxV.UԮf+vƆ//ٺ7!H.eXey:0&<'Ӝ 0ˍo7#N0@@LKxjTV.a@y!ŹEkQA4oJ-(QɉE _1dm~´K{w$0^WSyu{R&nG *$n ~1[ˆ1‚b/iW@7 #Kf{4{"iֆf">Q>uoî9cI#SF/g!-a-u=T\ fT--mФ(^vp`bM;XLr |xe_e B98'6} fi!ĈkDRV¼J Ar㊾H+`Z }$7d_Lz }m_%1X'a\Hv:0h Śїr"8&3; E_yhfCy @`n¥oUCo#+!;n4X;o6*j^yd9J( fe Ðꔲm *c2:hV$ԉ?LϷ y&Ԡϗ w{L z^c:6 p6;`鞧& nZeӆj{\4:QJmނ8J|nߗ"y"kǕIEך;B@@Fi؂хXaea5@_±эȟa3Fݾ&6]lLᓞ#}GtK*g{TYOz)MγqXwVu0=_Q 6g}$oT%뗡P٧)Gt&&8^ ^%D.)օPF+?3BV+X7xY \hnE܌U 17tZX;3;9G f8r6JL ^A2 `'w/4A B6`8&o{ѕolJDѮ5/Wps憋 &s[Z;{g[3<&tԞPMYey)i\ȒwV`8R† vpMBH:KkF$Md*}sK0,YSc=+Vzg(xrM+Bbl0 E/37`CVaxaY=Ѳ (>%A9u11/fMeYzPtĆ*) ɰWk-~ w6AQ'ٸ@zF󻚁9Vp>Λ7eaPkd-TE  l,~/{z.HI ǖRݍei;;;2$vsH؈\bL3sZ s71_TBKOhk3 >,!-âRN:+3!EDٸ{[B>I#7=DQH8ʶݺXQsr "vk@qFj7k7r1{˅dó̴"ƫbf+hlڼ=~Q1eb4ځ$Y<ѡc+3GNP˜hj'F` <(>QpBZ{16Hƺsccyh!v[B !;;ѼM׻<ǫ.rIƹS:-BY*Yt,&8O *UK {s66ik>J?9偣n :20C`jfOSC@'U%#"2cV،F-($$c20hXdY-\dG QacBEm,DA @@ ld'c"2"DhYh a&1RI,'N\&iX~,"+2i,F"1A`) 쌟nPO b%$XIؙM2CQJ ZW׏FMS&R ]ܐ@17L5-Ct51C<s렔aQ_a3͙"r(0R $6I%yP6M*ZTVXw4K.%?9ଜX[ ixjMhdYUbPYMg__kl/́KrD=!8RVST1(}$,UB?> zLgͤvfÎ0"Bե4C3iO 1DJ02 (l 'l:D@$LĘ \ :gVƲ1!>jЄ%L,VD2iŦ4#} )IO@TU`5掲C<s"y"",`HR ܐR _!`+=!*4DdP>QgQC ~:&'p!P݃ګD K)%%fPI3ZY_9<q~>wIMxR|z¾wP ( 1 Lx07gT_x`8eț0RB@έ /_mL8|71>;O˛,ho̿dHBS~fgFa=F(%jdNN{..q sJ`e?, 3g݇AM'^o(ehQm}I=='p!ݔ=kУˏ |lRkhhVzvS1JHJX(,>~"(,:);uo^Y%st!H&Saf6h+UN^.%A 6ߟ !px18o,&:LͿav(c((Z{itz@ꔲ.ⱒ ):BsIC ˍL 'Mệ%ɬT7kDCe STmy䀘 tB:X"dp鄒V$'W9obR,4'ײ޴j̃?G͎ζ$%zjy`ik>Za`ȿMS>135'߾I0Av=$Βyu9IO0v%gL 2>E)UH@m PP&&#aT) k*ߊXQ"c<+JHvt:8Bq!>ϸL,8n44 7؞!FNS(aeC^E$A +KkZ_3FEJ*BBT.̦5"3ִe!g~މMR0YY$*] (TXJ6-KC PF|A4CYb2&tdYimt4@AX(毼}jSD6a,B@(*=4 DG /RqEe8<ƞ<競 iXwhƎKJ"8X nLH(8!YE@(iI2(ڝ&2sEe^37ܰ! =Y'9 L`bv_oxX/,,feպeH tK (j&'`j褓qAӆ85 J  3i34J`gZ Adfr'ֈ`BV!+a,eDGծPZj,5OD1i zdDD 0J&.A62jrBBB$'uA<@.0N!oߗ21S=Srh`Pl(jm%*j(6nc35|0  fU'3"M/ >)/D( 6kHP,Bd\FCY L59 !rRhiCP`f 0!Ճnȧ03cb&ARdȂ( f$.\*I޹jd^s c(,p:x- mTX Wk Xovۤ Bܑaz `՛Zm7ޣ6R,ڽXBi"QPL&5 p@quS%S4l(&FMpQ]qGVȺ'Nd+1خ5{95 M@%knwbA/!34 3qtjw@-RmS B9uq0c98P0;+xo\N UA"4L-JebHXp۩(9EfFрGC%ReB]ZmWh\+ 3;J4;+Ltr/=i*P1(7ևQAE'#]D* (/7(qu&1r$ }t ɛy]ցղVjQ*"g[dB Da&0*P/rt5|HZ6v\0q0I,5L<,峷`3SU@#)fn 3&;L c*\ъhU 7Ƥ{35m8SCN #1ZsPljBـE[ՈudMUj wUBhfٚI"IUSk] P!4Xbtn^Vmڝ l(H=C(<'-Z.Nb\0WsW|D!\%xEMC,K3&$jEc'E ")l28a%kK2@512 ;՝N<Mtr&Q9Pib@$pP Ht:TD h2&UDcclX  :f@ (EQqPjuDXt؉5֨(Y{1Z&52^9E09UBe`XqMt^-7ythQک.5Po<̑%caZ`Poh0drk^=,h%սR`WE ]SA=[ t x~/—,K(. $5i c2hvk8Em*Ha X' 4ƱKܳWh\&T.J[r5Z4D)sz.#a7qkX7m.St /-2tT W 42QFǖk x隉l!q2oizj&AaѪkQcNf5ЕX!e *i pɓa]o tl:JI]RH_L35*IJIJCvC41 y޹ءy ˰yrJ۽h]WRE;t/ >xX& K&흸nBND ۬Vq E@Y&F@MjM38}2Ou&p >ćC++&_@6jlߚd<Ցabm;jʇ\yx@m& s`CӬ7P;LӔc$6C& C}fk'8L`C$Џt.¢ a<Q?+tԂ% FS$[ w.N%ԍ B01Q(ط 4 F ͥS:q m&k%-JMcJRy1+Zn*]Q)$G;dfίˤܲTh4sVJ˪ e5w2fUG >n9"iab d֩2&թu 4nnJ%,%=e$[˄DƺR9Cg7,vRi Q TEX$?j[&H 1"(`(Ũ~X`?FbI+mBXO]Pߛnf ڈIQ$"~E` 2eI!&Z}r3(M0=MvRM "DPe$;Ji6ϖM2JikH, ̐ݦOi<ӦvńFE$! KH$'na3jyP2CgwFXdI>a:lC9a E$4tpʓLC_8oީg#TS&ע$>yKhtfC2 ;6 Bp04N6uAdz$׺'RSsVvX 1Zx缇"ޯHM¡6qXc;xq4gilvNP$ Hb8,4@)X&2fq[poM&uיi<;fAZu$gat !+&H{C "@S- =!l $~|5fj=R{}2'I<8ے:L”9d :gL%fyՆI{ yP0L"tHD$9g7aٴL9㛝0 vLw\\# <gˆ0C`\e`N\Dvc`BObLd+c$'6'2vJ' HMq݇!+^1;b:K@ UL$wQ; (Hқ\!CA&^4`!T/i %S;n 8{4!0^^iNfݺ7oM?wfI~"d>ҨNϟ$_w!w` 8yI2RTa{jCOi=ʳ Ik70=Ր5d}%4e' 0PF.3}rɉ+{;CM`_5 =3hrIzbL2m4a!}Wv惘w组gC~eJOm_N!XPXTv}8"QO,4yfe&XC}VP;M!1_iC*ZSbHD1T]ʁI m v&5 Jć "I7+NY!PpL\⼢ptEROl6myTU6e!OP4>U8T w"hdd=;ql( )B(a1}v|{5@jL\i4n&$Qzarz|0߫>1BH+6 'pHA@p 111Cu5 m6ZUܩ=!}C&,SX衰PA_䬿|g{^4 >oSa5RFH, n!Bq̊q fǧ9J]iJ e"]ؚn?F"Vp&2a9;)aVN IK ܤl_\Vz䪋`0#}ͱ(iUS*~0$W9 S <̀I`$!*0$$hhb򬀮BBL{#ofرʛc.űdm[2/Ap3nb^!,;EhCJSW)UtV4%H;aPVF" FcZ nQx1QU"[򢖉F.;3jzF45 &{eY55) Ж 4Apt:.qvݵxu݁.; G0"/*@ jE(Q5K>^{B!3>~8 l< :G 踌L1_ZqI>KrA3T%hsCZWL ޜfכ˾TF"=s hKW*g(k`Dսg$Ɋ` +Жzkׅm9m,2#ugHcq 'VXwTשa]V5POY0/!# RQ $Z q)N 7_,m1("X,(wV y&NH/FVPO%h}IYP*ӆPWԹ'p#fOAl3[]UH&缪ZR̡&"fs=3\Ę{D4qو(B#%V3S@&nվKPl41>[R/4kcPvٗG:jrNgdHL 7"S#+8}# eQihѷ}<uLXg,+1|"?E 0X9Ș2Q<̞qcD?/-r@,)`ӣl]'@<#Y!OI%\a&D|ݼzk讀D</t^RciZ 0m)gXj&(ېEaC} +]lergZf,?icP@(5O_X=7Q% u I7}(Bl*IAI7\G/$]>^Velb S1~x+9|6Sg[ Ƀae҈D\WAu.^&C% DFx *qqR0 0"AR$ЀC&GF}uL?!U@/n8Dha5T#4L\xJ:Fvw m:p\y@'xFjb$QHOr<` BK`SU=QJ:&( <L1֏T^T. Xb@"b2Œ>bW_A}x;}$O6(04 BESՖ.qۓ _Y'/lO,D(1',h4 (QXc#/d Ա݊X Roy][BKl=Mm^h%KF4֒s6|ӟU.!5r$mA &~tfmGpm(q'$tUA>‰#+[4sVk z`v.nm}Uq΋; n"e ПG_E5H 6;6+cq $@ǯ9I }å /5 fiJE2>Zv#ȼ}*I˳^ϪjH*> `jUagx Vdq 6Tƌhhhѭ3I3`G.Iǭj'B  5UA5r]\1m6)]\ Jh9& @t 3#W49o9qv9K 0DD5:L #WOm4^ ŕ0Ă=:FLEVG$ /!Ry|$1ޞ\3Ŵ؛cKk '4ءo Cj'ׯ{ֵ C=#)E #ӕl, PJjha>XDIav&>)GDnLh(4<) H^Dk6>2vhDHYϾkw`Vݩ M((}|8ENcm MRpiR? / kL6 o!OH lC1F9vSI CsqkY5ĸq8n*APN;)DQq1 HJ6P_Э7S> {ǒU8aR}T ɜ:f>A|%ª#$ rQVB}?vC8` Xz.Br.eh0ju++P]8ZNyx35vKC̷JUsmDQ&m6ʰl0Y6ѧ+ZAC*U,ZTaq(dH6?rΛʣ9z#̣e9#9J#ڬņe+ti\)E(,V1` *'c!$*F/IsfBj(mT.1-TJZ{R ,A4v3l%^pIPЈP0jшwlUbcXQ=Y{ҕ@QMn`\h~TZ<ȪQPƁX11mQhQ̸K[lUA`܋Q/P2 AWE7`q8AS٪nTjnSQ]V)uqDfWˎ3[m*"[$",bT%bzpO]Re ͦuLt[DTF**>fcb~-y3F9;e|jAq;QSt`6cZV̗ TuK3fE\j*'߿i-W!(}kY(ịJ'Y49nV0]`Eʢ/ᨗ_XFRb*bTYf`ILNɌ*>4UV_ޤ=!|R95CjQGf!Mf R|M|i+7\ҕj-7^:*VL) I A!t/TM)Owhm e[b'1.p˰(i qy)E_ZL_~ۯ4>F+:aԨ;p2v~LdNC Y `l/5wiaFx,St} )Os@:PE[zw`> lb#ì-e32c#FLZިhF luf!hIa-1ej jX}u0A @7lʰĪՆ4=5awQW,?չfua_RQկւMd7{7N`\NTmEbģr ,-lmV!5ֶa~U,~QOlE]ݖ(·$iCI9"FEVJ5U1d(*Ɋ4Wh(1gmX("@8ca1E-SX]VGVMxwNƊ3YQ1,bUV)*B*`T̵=qخ0H$~ Ҡcc95M d2Xxbbq\$4ow&)?`TRFZf9 \ֱum sִ=9xhsGJYY1b=}LepsWVUEAF M4X(FcIO5A5SmXދuLeWmn`b(JK5j4[dOz݋t)oY̶DEF~ĕo04"Vܶ&ZPwe_iXg" ofe1+O5hnkdHte5lXbPET1ı>Ry TI)!%lV3TZĔH$~5(R)`A"VU $$I Db%%E`% BD"  J(#Y!Tje9J5Pü"F. -(iB)ALU`*A)[JD1(ܸXW̪ZO ֪"dqkŝ40^2M^kqjqVZ$ETyJ̸KUIEb 45}F |nZU}O(T֮$sN;'Ta0IJi+m ("2:z˙L~"/uiS`tԾ>O;@6?DL s%-NusƳ ]=ެolzht!]41Xyf{ˉEݠG{Υ YیdUXnҡFDRw<ݏ *3 _*kW5Xq;aRf dAl)FBvxv{nC@/=d1byHX6`%zj?2`THFLQ2hLשlۺMdGMjUz4a_ 'طyE&d,Q TDab2/yǯ.>Sc=\X4ŭG3 6L#Q FШ\plEX̋1@HִBX %k`İe [L CT*ۧ kZb-T\UEn7.7 L(R l18cIz0@Ey6Ko?OHDaJP Fѥc F .O{2-eB Tޛh6š( \ `MuuOXg/2ĨcSÕM&8$n8,RHȣ!N6 e%7ڜqm5K3KNUd([T DAQ H8|Pu[rAZ!rS%֔Kahy3_xhtwSq Q i뼘i\ fa,EyJQ Ze&KSթ/,PQVRމ!fiT_vh*hTQm*" ]wGtҞyI! BD!2م,jCe)V! WLIAxUݨi5% M]]Ńe"Qb -ar%]ˍ> \1|J#)녉ҪDFU Ttm\^m1Qajz©}eQF,nY|d'dPAYw5EX_K1 *owUQs`1αr(/T*SN`Kް.Uu`D\yq32Wg@DUfw0X fTկXJ"8RQc$)az/٣Q}74Oy8?;~*؏K|PV5Jbރ'&X H ';LY;Λ,>]D@]L~k̿ 4 }Hv3φ3ߤ \šb3 ^|f3%,YsiTzN~7F կ_^1:xcT!Ӿ];4jו70`Vzt$ra-1RKm e6(=V|>,Ү^aO;31ǫ҉SsK٧5 *{woҗ/O4t֞M濯\/kmL Ҡm;L'$!Gm5vuYYcF4{6B_dHt n8J 6HU@ !Z(ƇG)oF7x7نBz *%)LCC*TGƬO0[| TQJ[JU_bbL&#궂1҈+Tk >/ˉ0gw@ryF`*Ĉ1 2 * T`E) IQX$ #9JD`*%X4"] ő0b" QTQQDRUQ@X")Hec8Jv#|0*1e*b;eQiض? D;Si•b 1TA^PueDgh؅:k*0TcoeKQyU] Q%HFFSceSZu[0IADN`RTU x5ȴQ4b#s==UN X"lGƢn<5hj]a8Tk,ں=&c IRuIHNÞXm*1%=>Ywjcʬ)RUȉS.%>w 1>o޼0DW !ڪ_OQN+!X|@(Ԛ߫:u=҈S|6|ϋ}q=ژh)4|BstS;۶T~_ezd~Su,Yhm?4%I$jTcTNƊ<ԳV s}u/z5dh?ܴLcBP«#PY ̨bT i=V 妫 Pvʳ"/q~!ޡv[NnAb__ϖDD3jvG-?"vY/yut/V2RS=?=V#] d5ib66]dD=avA) bŅt(6xx2TdIJ$-ӡ_dZ֖ku6Y"(JsU@Q6Bg]MPȘAlOVkY!Û&h@OC42*+=2Wx@+L)Z&JU>A0' 1Ltfb8 ,(VRo{ڊ- 1+`p˦-cev%b?ib`Ȣ3TEnd˿5\RIY(_/c ;ʢt{WLc+%a}XkpRįv] ƃ\;8-X;;Ub71OSF**[UzZm 52QX"\URhP`i=)ӖVтez1gZYAûQAckEfZLˌ׎k O_v`mpj[^dF.ұdFnJ37thEY?^,UT1+dG,^kx_ozka[bCfL2QH5-r*BP- ^- $ߑ8%/C퐪Ůĝ]Tbl.2юyxVz̽wfẂꏙ(Ӱ>-U"F% D"g`~&?sB ƢĀZJ7Oq4f\6,OL9P{.xX{5}F 9lB+9V!MR&% X BwMs(dХ5C4NJz pk^mNi! C@چ"4 CHIHI&7 $" 1D IȪ" Uc: !0ĄB@X("$dc"DH#Ӯ&qpq!K3RhRW>ɑfT_Dju񹾺%QSꅞ5KĊkȾ_2hsNz/޴N/|M') H1X , ĻVKh0ȓKH}(ɣBKk&0Z)X6*EQc(#F)$c T*=JcdjP}o,UUO`kQb"jLA`ֳC4oDEb;F!ZC(^'MUTF kYҙ 0maV骱~)QıDۼiL Q6㊥hn|݁saql":LA<]]>RN S8N7//&ck|NA BOA @уBDG ͆C5n:sMG f.$ JD_9g<[QVax+ߖ=\qǏ<G A2[)rZJG3RjdX,Q]ZědT&:HP[+:N"J"2Ÿ\?jFA/q G.zԄ* \_Q7azCo*mKJĂm*q]u&*԰qs͵``~ZūeJ[mUbU1^WJY~HTܿ(@U+&H<ͦ>O,QHj>(mw}g\W&ذEEbR̵b?U* h^=R֯P% AT0}4zs;3m"}b騃DdzCOHal1C,h 406ۢ|L6OnR"0X*|Jn"30o5C[by;wM6nFD9WWúXHPQB @jNMa8s4&AH(- E<ѿcǺR8jgձ Jx{M25j8Lt[A;xL*PħZ*1.ps![YXG* - XTKgQ2P*_H _{9iarE !I"'-FVx9f@uA~x_i2 /T1K"  fRTR"!m"L0S"6 *D][^QČa'gN5:P;ڤHu7#p,?g7۳mZ/\ož.uJ{tv}kYpraIֽ]BR[j@Y&#h8w,4A`/d@i.&j%3gM-*=W?EF L {O]lpK=XVEjS `7jŜjA{T=܎[,;loOpZ'O ߒʬq4O(UL=H"OTQ u,;O ۻJ/S{to DOľ0QAS3B%oёbV\:hʒe+S24wEd\{T|MX^T[,IZZv4J$h,E(}7X""J$c:`D^!0(QF,mY!a_[X`7Xݟ0wOfYD 骉mU<˝%ժu~S6(~xMHPYX 'u(!@"ϧq]_"e$TCMש0pY`P/ĥ|lxѿ_|5@zwNuxBX5zf"e+>^#Z Dަmytyf;W]2ֿZL_kb"yQL'<ܚ/ # dC +"hÜqA$gU|Gϡ/ EΧsZRQ-E8BhԺbt֍z[N{*~c4 m#H0,QWΡL 8Qa)Su>j%>f.ѳ4$QBRMDpLQ?IXtoP0e>ٿ7,qcTXB%704]cHُBs)4F1 aD:`0ۘm 0OK,~mêazL冲tϱ"$S:je>ȋ:͉,~g`|G%b~{fRW\ Puj[}4LTTSv_Y^/Z^ 6LbuJKVQLaG#{f&vϨt]ӎ,zzTM0QYB_1TYLot5"C{S@2jT݅dUX59~yCbC>ZQ"}+aRuvˎ*#? v'y?ϭC ?ί,ڰtR埪udAkk4QZ=XT75)[04k/+sk#i[es˖eƹj}tni& h+~im y7ǣ7cYm/(5e)^.ɭډ􇏸ffbTLjLVJ$.(Qb(VJ*Db&,T(1SeX2$62j[."Tnґ-wXZO0h=9pSlL Bzed>=WYMzzV޾(x+h[m4[`InIa*w.JOi%2ٖa׭柽8r rIM`A#2ŒIi6>غLS'[Z2SYtB)-- 6@8NӶ8͜2e 2rZe5 >XkbxͲ!)pe*FX0И=fک4Yf{yLJ]pys`R$krsrs{gFΪN_L9dT:T<5z81@QY7@:ʫg ջL9/&AaCHKg҄ <鞭bLO_Qtw62Vw~ ffټQ 24&8d]d\7jxw39 $a toVnIR2f)YW7`ēl50@4,">PR`$r!kf#nP!*xzb ߪ&_hMVT<60 *:c4I->,&5alKMj]%CIGp;e~RhIV~5Nyz/t(X{d4X"S;EJBzf坰IQa`q "^YrW2NnIvi5#^e]fO9 ]SB1DvrУl!R>[.I\.+Tiy?dx{[˱%*D"fy:"iy (ܫI|W;3zI&.8)HYs c86w4N X&C 4d\g Nl <ƪpxL5}uCޡ01$+d1xdR,P$&Na^M:^{-nDhZ̀yɫ#Cb_:I1{JEtF2IXCkFD|Ɛiu{D@ꝭ c3-Ќͭ2h&bc(laƕDA%2N\na @f/!荌!n&@CLt|8+ ,|&Ejwt3c\ OΠ 1p.L 3ΪH_i1M:J'YWEBW"^"ClO;:fyZI wXơm`dhZ<|x5!OWY:vF5FћBK4TdX+@8R)c Y q5DKT `܀]؉l &:[ _OŨٿN]iRޯ'?$Z}WNt=4 ַ`r#)aSG~rF_$GHߤ¥hb'"i-X2zR2|4 Ht/'8zeɸ0t-2JDs^7eyelwzkHp$G?*p1Uă k;(tP8TYgU ) !YیI|`ØW;AH'R@CC^7~Iz:7R2;k̎`( j?B1K#Km4Au[׮ ^_;" ΕLAS HAݝ DјEѢS|tw2]bnE@,8OE2VVŸ-ɍemo"AXHZ'3Pn@nBP\ I 5 DXʶ'勤ʮ?rnPM5&13x񚈱TŸX;b !p*% Ғk.V.CP$LǾ%U1dF4%(}Nʇ愘̚TJ9)ˀ|AC-Z  QDݩaaOg"& F_wȁқvE6 b%VA$(H JkOEyrk~q R,q_G 76}jc5j/'BsfCF6\ePT4i`>*VM #elߡ|Հt/eqƹVĎ17 +t-J"Ww^b:UoU@̻E`CNJσUzJ>l{D\)% U۟ KpcP<N6;9+vl''=1PJj!=Ӛ"(iFs.AB4Ke5ׄ$a3]s2jt0O}^)B@p{aG,17@2`\'?veYPM*}5K~,6K$Qp ',\3Fll:q*ʃق=&StKǐ +̭iTȌNpz;AеN0Jj=hI*Tiͭ% 2Ѩ)g3dX Z`ˆjD|'k,>ga].;Dtt "GHHI&/]x2#JhQמ17`D׺;,&R7Ny>`bF= U-+cʃ*@!E6gMa\n!( 4g/:lSANZ0VcH&Z׫9aD1d Z9osliYS U6'ZM7TQ㊵AԢݹꘜN6*uߩ=\Fl ǫ GTTцr 7`0h{^[/5I$TMq1=lj#@R#BJ`w-wiݨλu{.rh%ibfB*_C۷H,gI#kknݓQ{ t1~YG(l٠٭Z`&O5HbM NjƄT $|u$ʬ@ZtI(> y( ➗Ӊ߆˖6_n)=1rmm;Ni&[8nYWE$"( 3"5:Px7cMOA ΟHw9J)$*vNcttuDOpVc:`)vF6.!/a٩Pow Uxz4tA))aLK"NjuC>;ۤʦȮh׷w+H)a!<=(J('2 yH K:0/[RkI b ycEo&׵C.U#„Ou:uڗ ڇ˫){1e=o_`~?+;׀<$cCgp V ,0o\žgR[>CLj@IB  0[h_²a2h"DU2`fbc c.YH%K ywHoA]iILb8Q#+Am(UM0֊bRzP]Zs<-=MT,RHGE"(iX.:5"RX)M&8%zovSZ uHU("'vQF AvRF9V+V'-DLs]tɆ$dQMf2.N2PS-=Z S>s.WN#2A#Ymwe]i?Qc=8~4-Ss(v5|PĽ7ꍽ0ER3%RX5߭kS[f !dY>)T)w5YlDub :iVөseZ 21%EǼW3y )݋EA`?Qb%ҟQDX߭um 6?TlS1~iÆ0a T\f pbh?;͕CN 0Y19[( (Q3SA#J`bI*>j#×:{8 mQvO11\_(hT߇=<zfY%9-BHM(m&E((-\nEnnqkz?Hx;(}$dpRȈ1":T>MqDM9-Ǧq6)4zC8$UV`cԥ`1f@̲)%Du5dPL ƍ-+eE!`*T\T+e/xQ6Z-ZT8O[#? v| wtq YKX^Mef}Mzz֮n D*}b'JkXFa}9\%j#. cLZ~ܪȪԪ~,qQRiwNR9P2mëf4ΰ{ɣR"Yw~-\m#kN\miMr9DUSU"4KW'y)z F %QUB~XB$#{{8~WCXHb"XI";JG1DOj*JPVGz "ZdFE"E"1r`VKi]E,~ͣX,b".ߣ@V.\,_Q&UՖDE>7uC/Ņ*mbSS);V}{|'X(TQP;]s|h]Z?R}.O YC 9J >ݾP8*-fj::.0x . Tg '/,:|VOV7Cbm5T\1؎ Iۜ}vcKyLm462LuZ͹?. T>TOM8u󩌂YKïOa!Hb.|z1YJ,C?~!-!(~δs/[_Gapr (Ԁp{S%z@58j/hf{aa0S2*e ԿU@G,<0M?Vzl$]q*9KecM4bOEAci("ڈ`g`[W=T:PE"h[\TQTT *R"qϭZ?qDTh EUb~iS_QAUb'l A# X(^VfVv6rʀg|^G/)44PIu'J9:҃H#wXaՙGtz3lb3?'`dGv{/7Anid?XRu~]2%DIff*o>3=hǾpȴɴQ׶:~D(uKh-camʹ4Ԧogy/.khk ӬF6Œ T5tJCX1VV4 {+DQAUDPUp e" 0Q#r !DI[mmeVۍ] -;D *Lw i2AIulOvC|*me72tR#7䱜 [ĭ~M {i7c#wXgsMwE VZ{~KJ'^ik7nE6 Vl5[8 ;E[4 ,)7V˚Yn29sdG7ۜ3hgf1Փi˽څ1URQ*Y$R3{ h\'d+4.Kɠ"LBbbi 2HP$=SDHQ*`*UDEAaiI1dD VGXOI$r*t&COt嘟ѵa?=4abi5Ms}Akq WY"X0HˡmC$e$!PADEX1Qb1Db`H Aa#g|zF!P,Ը /P@Q" 9Ziۡ_wxVr+ADUPDU4ӜƏv_˴7HE2uO>m\JYoUR(DXYWc4ы.}f=+3OTTNl_f~)، z }=#W(7% 'MeeIm7kuteݓdx1xZ(ċY$X296δX6OM4+s!-Wᯫ*QTMYcU+lF+5}_-4QDveEK hF'hGw㦶Ы 3RQg>Uo v%f(tƴZs-Cq5xj!bȪvP# 5l IY ?Vi^Oc1S@ Jޘ@:  1xŅo@& -B:30bwWOXH!yό9MFՊ-! 2E {I6Tߔa 2%]קPe=i׺ ۡӧw?+YK-*Zժb1Z(~G2EJZ* %QQoYJQ?v`P1",BVF(!XTC3LJDm`cokR |DAXټydF1DԂ0Ueq5h4cKѳA!VUJT -Hj޳ mR@@Ą@0ɚfh22"c2~){1eAݥDeRryX"=RWO|v.[/e( oNz#+kf{鋫5Mqm}q媱zMaT-e eC iSP:͠nE*T3"4~Je[t#D#:x 0ٟ6QyHP1PiNzŒCYթ|חm*n PH=|ahX)UT\U6=^}u}3{z°DJ"FAb> "򝚪z;" [|ut5g{-mXdk}Z5gƾ55]']gtRmd]Z)b<Ch>~ȨNLgb%J"J(0h垲tg2es׬0UH|(†K#½0Gߐ5:{~3x|ՆF[K۶q\xxT坧9N.1"`Dnw\F5uwzټ,gqV@qV)H HdfFD~'F3-EI[h""rH$I4m'tZV XbJKi4 O[bTPɪ-l4{p%˒˯`Li,uW d]\d!$V"D'QAm@`zYmQ%b RJ*R "Pbj\aHTp-9D̚V {XE7?Y ߫<֨wZ/Ό2;,eG.wemQF&fQ#OGZvtô6WTh #Ɓ<hֱAU3dmѿ͝\X"=JZ/Iq%F5`ۡH8m!Ly|& 8JF3jbT_aotJ6ħw}?{>şVTb MX/ d=h NC&b]*Eݖ e AYONV1&*/(VePF "->7NxQ^r߻%:uqҠ~hΥyzgopP} GMhQQ-)`߽ᄐc( 0=Z/@ɭGXl%ZT #zA}Yx6^Z9_f7v:L;I9HTuLEvVb'EDm@s;hڷRzK\=*0%[5E&"֪h_> [` @ ݋#Rf~.^ 2&T,-qF XLug1Q :ǧm5cQk({MnYUĠn:ˉSPr؝P(1TݡsިUL E Z>gu5)@jfϟ62ug~˃ Z;eYfQj{:0] 7,(b"#1VRfu~ 67T(  'iXu%ZJ[ ys9PvX+̕}?I[T74nӡ-),TD)s3E̐cwԫЪ"X*-+H[!TZj&%tjzFC8#4sՔȚ&w1OxTU(;y6|^t*Vs̕;y10 j0#DShh50 6{i=拕?~#_? jo(IHp3{%@قbhVs():1'\k%$AH(dFP&l9l&bïz5j|?^]y`iՔݮ\ Ac^pɳk\u(S*"' g/%DxnFC$[?d!N֫ɆQjV*Z֝ 2"';xL: K&g*+ 0QoV# E9UYPC,!Ko̖cLE^G?z(]r`NhYhNn3-9s+˜@nde-jr`e}DDUǞ6t?A,{ D&B(I JBB/"jO)$!I$wEi>6-(osS2RTZ?VZפtaM9L)VlN 2G 'O+<3 }+99%щaHNpy̽Xh2dYT5Ik-}VZӌ;CE%aaǶ~9N(Ya[IXk #٫ݥiin NᄈIsDr`n^LDT,VhƲ@5pv s`,`(t_t *D`DjPbjFC*EJkFЩ F©ፙ"h2 }kOTiaEZdP8*LE?T 2qa "$m ֦5Y鷼3 (8q 5$M1B^%&ht$?qoWh;@KPrEV~5RQtQYpA'5>a֡YH/ݖU X C]? L}埃IbQz5!:$* [:Е-@) D#E&F|+2)G^Tg5QGew[@MMŧ]gh,dzLifOnkb|Ϣ݊zd( 9LX}|z7ȱupeX7ڗ}5ϢU6TTb+1wy4cPbxzd!ta74v7UٔB @mK3!O{ B9̔ҳ/?ՒT)1f$ 4 -,B+PPAE42z)& i%zs,:N9ꤸ<3fJ`ZC8uWx?ip _xw%ѥfݳL4yL}jPkuBHsV}!yt 书22)*Vy d"3ީ5`m .c;I1QհJ2M08 '4)glSkh2i Pc&5TPhLC5v5aN3"K>52}qɠIчCn +,(?tAM#E'vEQx3z>/%M04S ꅒPV#u]^֥Ίӌkjl**֍5*-Bf=6 Z=q%f 0v8ut j'IY߮WHm#T dш0sYpafjc&zmva21DkhxWAPv"e:a#Pj/IڎnA!P %sV[hJ20@h."6M2Ut* S!Bٳp[X6"] ՜PH3r l!&SHU`33\vAݑ`{LXBEOk4t8 Z"L9eʯ߼A`A AI)z/8B" Ǽ1)x]0+ 2i6mLP1F f&u݁Yg XO%0YN%lACSvf!)mŵGW$?nߔhCM x~ ΁eb eN·y9aHT70GlTi8U*gEE& R5Y,Rpxv.!41)a N>rS흠Hifէ C $;J[mb_=bD<ᕄ1D1PhU8Kix.n6GHCcM0G뤨kt2HBy,!b BG1$;ޜ뫛:@;',;\Bز`Bh=<ܸnkSt`5fz\l z vr+.eC)m6A&Tef3L{9luevҦS[%NA /lQ Ai6ƗotT$eoňjmÍudRRYcr2!۔!%UOҮ^kFYȦW޳Z)pTֳ Yu,̹&Xcbq{ (p4 Hf d{[@ȳw!پj\sE%W#ٓ aE@c0Wci9tMa .C(߽ 㔤R̠,@C =揯W o6*N1EqP21DhbP, @;8*$UIO 3u F3[r V=W!eI"/(!x!ݧN3iM3=$%Ht\aו/x 0]42pǦO3$ _u d;dLvHu 2)- $id;pD2&`m:JBКӏ*ed @ Qt 8d"gCז1!$!(NXR߭N&@6xp0Cd+/ڡ=$'i 4I[ Du t[y.[">f,\8LM M pg>Z7@{Pd*S#rTKC {n'=T9c׮-&7f!PJɴP*#=wI,=ЂN q a˸IݡL$4Ɍ jC'Y 2@2hNxEZe;^쨍㾷>$/d,S@o Ჾ6P`?& ح `@$@u]y?phi@ax+tAHVdAhbÃ^}#`;6>B5UAz: ^NRM퀙f iDq%p(%N^d (vu{,fHgQ'ZB ICq~< a~L=29nlxl^`rkl 3Als>JiTը ^鼂nv$hT71-~x BZa'6:a* qЭhHr(MwRΌQ\x2!%g̣xhѤd챥`è9DPghm)~U!f/PXwda5\.l+B1[#K$Gn^Հ<+*U3GG캨eq94ll}bh\ڭe++ވ?)_G5%:]307@.pz9)A>A H> +o֢`sB ـ~AdBћ#J ~!mCEH$dӪ0!I.=]X8"@^wϼVr뺭$^*Q(6.]md{dj@31w@pr](\k.^O@ @/H $#tm0:z;i>dA$xvn`/*!t<zFDSa"0!4kؕuS)b5,t*/; OdRRyJܪ!`m㡯8"tm"UA1҅M&4,h|5RSd( Ax m0;ծn|^hOU@@:sد-~6lGVBI%~0߻԰ Ur/O9Z€O~\/d3cU[5gԭƹMp:D e/8KS_.a4i~C3P!."r +D78֌QqraBJ:}CpOԘU:[ҡnҼDT@Q?,@mv_弿A|3f5DjbWű?{SEtFˀ{Xa4!!)"qwG; #N}* &G@AD[;0qF闊>:|Q;G/:Uc:>y̘˵ў%~zڜZ7{b D 9$Fr*g3<*7v:r.qȏ;qBFHjh9vש8ug=?9LЍh0b 8H_U*t#:Bjr8L<㶊R32:72H*h|/"Z߬zV<ܽT|wFbP6+<źjr_#Kۭ;e(V l>kݔAuNHT`/B #BsvЪGRD\N|onJdjQ61>@uȧg"C d0no3<0h\;w'H@UE~Y t"E+;&iyGq` =wZiPX*)wk"SSK}2Ҽ |C-\vMʇ|Ϥ_abPf3S3jq^Ղ,'׫PyfzhKXYNfSq}wzFJjt{+en7Ϳ&" :wqHMP|ig(,[Ad1zݙ_ KL49N}߇ I6r9slVi7nAVrˀ ۃgk9ު+񡡃ݑNF9t uBb _6(h$b}/_^` s_MO΀ 7Fy!cw^My ]PB"*頁MD;Ɣc#)M *1Ͱb-'YY+Ҩ*p03D$3mU& ?s3@#0E5teѮkݢ3P "bWj-jGj BkX@4 !u[D 8jD3T* \E_%fE`]Vn(PV(Ї*fwa"q_L?NMf7reW3m2C'E\]kzo'lL A3ߌ#쇤+ZJx$()-' O" v0}זܫ*;h+ 6[yH^\jM4QE{ /#ah2tl2D"&B6V8ཷtB op  :S3F-p <ɞsG ,C^x~4Q#AFk .M!i6ɉm46_Do^G 4j  %+1Q^KmKYUPV=!h] brMK Sz[]oׂ<=\]V >vTKv(b,1s3C";l8Ţt {"P,d} k^)aąͥ|ee+B J$Nع $Iv}*s a =mN%TXz ;e`cgo ~|fzJ##E9T wgI`b"k@!\5gIUA`~O4׬8Rؙ(PG-vabl,,[A!m or7`-ZF2(~w3{k2v["K{C+1CUU^鳜8zilɭฆm&'v n%[ jh<$gn cZ#A߼Ʌ;ݘGac)hQ74򃒽۔zunSc=^=y<0gQ^ljsyQ4L)0xJ}~}~d!&2UuM?zl dpGVWWxE/}DP^4cHjIk{b^:hUXkRQBW (\3zg!zV;I:^h{m}H|O6,_V5%DiT_y2 i no?4NZ[)<x{=wo\om͝PAyByժ6x[%.6^Υ5)\LJФ,F #`ȒF Ȃ2"|6 "̡EF$TdD+"*  AcF $X"Ш}j$TEIKBFEb(1c$TF1ATXT ,g {gUg=3;;T_fC8bPs04VBh`Ar7. p@$z"NB~[/N>~^H},Q )"b*Eb" Hk~7%N5KE@$ )E +$`, `Ł" ` DPX  F,AQ,b1*ED`+#21e ,dHH2D(EXTcDT\֦o.bajF!?,;a Z+ d[%_A k.MeʒZ/ t!Iu4Ia9J b(d2ۃק[*Y688-~nNZW4 tyrް3BUkpM[ae-,diw*Ƌ5jI }FN*eTQTwGhSv>VxTE w7Gl'9I!X1TֽbY| Ub Dg|l-o hX,hYx)p0?0aY]8.?8</5s3Mp6 Xe:iJVK9eQd ,7,ydCǨ̩{AR(*"䪀,a(F CE"".eldȈ#UR6Q%e[l3جBOW">1~C`=|/.0 Y]gJ&uv ]%lWbqHy^ʄDf}#F}΁dp F4R6͏%wzpJ +/H&&QQDc?6QH鵣4Y`,FEEDTB}ҋQ d6;, §e`1bJ3ƀЮ%APQ#" DEMXU-Qlq(t-,P^(.Nf1`e,S|.)1!B;`c A "lLAR:IA)QJZEf`*m!@*M2dB),d9Ra %kR2 $`XY0 ',J+aHX Yp 2dѣCfZ@ Y`J|,c$!:V@ 1!utd)D;Yj b+ I.;Zj[JKCTI0v'KIFH+%6 Q PAl(6($@';fF*J MN!$"` Hr` H, h喑HkbR*M%DۧvDTګǙ\[g%.aJTQb ۉ &$M:ʬauLQtֳ,L.8!|ȵRQV7VӼ8c^ cy} *+_^Ok 9DE**d&6,b&0~22#zaA\f[Mnî0,#Cf",yPH=yIPOv̸fmA5?mz4~ ՋT^0 6_H 4휚,Uc*"O;y2TT|R}ϽjkFZ:ߪsu~Z* $**-hDbҚVNgztC˔SZF.̫mG>lyaE 2@d [DՏC4AA6b"",F1DQ #$dcb#yM~kPfZ?[TWVmcL ԎW0ER).(l +0#^x1hNsY .:L63]QaV Rσ("PaꄺeKl,Y/PQC:&I"ۺ!I~~k?/NVB֡D "~(C{ƯEra{?q-?PIS&bX/V:lx53o2ZGvX]a5L?{;WX~KI@'đ$H8SVAm =* ڀ3u.M_cޏSEEX[8`S9onMu?X꓎Eճ.>LT>6,J+A4O8Iw: 5X)hL7J6#ֵ;i)q>*7}ۧ5^5d~P"P> JPxZEC)~0/w.O-I?[s@b|A'8iHl֍s(ltCE톭1h;١ hwIG "C2DElZ[*= 0~iӥa1TXv(xJWzI))cbcw$&c4QCfF4LcIme;t`Ό ҈˳֫NyΓ|CRb]^,WgtZEu.[J2AѨ+NITuZBIGYC^%5:Je}uj2Yu̚m((آwh t,dc(HBI$hH#{[fd/p9ѴɀYsv۩UDbФmiu o1Jh3 O]k+KFDUʄ4$ɸb$0?J'$WjA(T2!iSR ䷺oxj~.U+ z1. vEqwc#E+>;)_Y/u(P~rKGIs.Ӵ9ێرC[Vuo|ͺe=7|ıztNoBDZsG,N58wRRǞ2sJJTu6ϗ\Ӻk:1|@ugjeAЅdOtSkJ.Axau_?Nt'RΊY^. &I"FH.*i\Mv‹l)ӾQB9 @b_0!5IL@ȪJ`(!s0”7[s[r:AA~S k->;¢M4~}hm6^zoIR"0D_}9eeEZ0ծ/?GABL2_6Ҽ( x׬a6Lvբ?Z*QXQτ|giyJ֡=;'?! <̓hFNS6&e/]Y\stٕLw0:t"FxebbEY`tK509h&M}ҹmr\CiBr8Rfa 7ΰ7՛OCYè4*dURmٸh`TwZ_k~˪;6_}aACVdjRAr jY}}W a!R }1v _"hdzk05O,>y$0(0EdAX]O K'FDBT ,shcH8O6e1C1pފ5[CljUv5u7y5UjV+^A_w_@&@zOSώ.ri$ i;MvhSQ`2mmDv ei(&HvٽSD70,ӿe:CQR B >U0h?L%`1bƉu~t]0xLK :eYAf/XԾiĭY OL㋊p.W›'Eӏv=vWm~ל´@?d3. 016n<,X8ƿtv-Q<Ѵͦ :גL{pH?h] nf 7!U Y-l0R(KW.-T S0Ɯ1}43ࡌ2 媀B&( ̧ S?k֪d^72f0}Rِtؠ^G"w濍W{zpS=aQ D;F %D_㈪t֭TRc$V*ϫ_Yt~Acb~CLڌ:شvt_Gt49cqS^ ig)pFm6Ҽy ˽[(;٤4jl(: !wCv BM4a $/d^*_ʁ/ OܲkW10rdo yXN=&qb$a힘xoĕa:d/űZ5^BLNȽ13\8h%d*z@OI'*HW,M0ȲNwP d:4T -ΊuC @:A~~7 qHś~"#:Nq*I<@<@jw oʆ,āڤ|_grYiSu!jv3 ur'\'l 늞Fm8@0tC&Rд% 3 9d0RP)lHNRm6#:@mD,ن\ u L2*:O7Pu+5O,h 7P0 2-t3ydRSR(wM;x UI22aa=P '7@Е2"x%0KCD:lai2a' 2CS휡4>2t i#I0QcI0y9 bP LAlY=Fl:gc׾+LMl Y% dKva,@( J!H)$CiD%IoáPZ$0< A{vGh-:yO2OIO'Z8Ő3wGL:d:{)\ *iHÌޕ)AI ԬaZ:1np-,\-r0LiI5bALa;xS&,cQI$뺁T!!uN fH=6 tPCγLjCI:C%O4ö 1i )'i,4j;M&ea6>Y(6Hb뇝]GެCH(uL9מwj/iVœK,p!o X$tK6'nd ח"u[2V SXbM$'zfFzV@8ZB@ $4I&v')N40ci zI1[2$CɷĜ 0!4ezr`_ޘ3&P.ʈTvP!½!fI9'WYT^ͻ fӽ8zEr6*}oK'r0yMsS.h]9xY첱d4;}0τ"ɧĶRiTI7@&YT6Lri,JEPS0FNɦuRyt{svi鞵DkGQ#C No BD >9aٻ|Cc5"HIbgݳ$ HD.1wP5 WPu:dR鎬խ.֡2fh].;{]'g}2sq@2.93fB,$5j ?6@SJɸ{=apk-?6hR T)jFa T{ntP[pr402>hzs`N&L:<|& f:I=~X`^d=M7@2BN8jCli <}N03'i!;a;a=2,&HLIԓi֫|{/haLʆЇ}5eZNha;M3%R#M20<$+ Oh|!) |Jve0N_^Wc_Y铁˩ .)Xfx.$ % Kgl3a!)m2!Cy!l d&Ǟ:qk Ą+zmL2 6ɯ][$ -z.'(rȷ5eĕzäXq !8LřM0UdǪ$:Bk4NkmIh$C* M*NS Y\yRp@ EXL7g6+9V@a $|Iv"KCz¦Y^hg|]tfC7IR09NL!%ήH L !x0& hyOI'L{O8d]HtgN2g(N=Yz,L1`|$x>{@vwcXHxwYV9;`z  jıq R!}S&Iz띩<<(_90 l] & :=-}9X/j$7m^' $j+Lh ߮ x4,!°q@[fBzu#pʼm[]Z$VXջ]m»fփP%$1fJRР=.7[^Ewe/`[Kfw1~fP]9jlIĻ:qK2Z঴|\q=BRu(>"r= - ks݉Ŗ>= BM؅v񡈤{ʫCgI3^L2iL7oRL"*>i**W  $2>B(HD80MՒ-BonB3d@l"?EkG4'X0YHCEal}Yw9p+VNߛfuHV, B(<l1:&G|TmNЩPWCCapQ^-KMH  RBޟj}8p52 BhKPD/`aܱ qOtU*eF$`N$btzf=[I Nt,H>MJ'7D6V= h']^PNJ_ۍ+ꗧ.B>,}JDC ؼx&3;9PVވ KS"!f, v6mzNsV~yU@xymCpؠQ~u}Hkab]켰X[-F)3ur3CX(\Cl9%ksCi)BãC@>̉vu{t%zP9D{HHBT]ܡ\8Zj{P8ƍaN ~VK“Xb2[cf_KAD8lZXWWֆRݍ6 vАfA: OyH<_o-oD4W.Ƅ$fS&W5‡h|,6-vQ&Q_J0O}]7QiM&Wc7CśH)r•FGǬ/eհWo"֤dG@z{z{f(Իb6yR WѮ|U0 ;h nPBGnw/\ LE>[֫S) d1V~0;Uv.*") _c\ WdEzsPL 4INրAQ_[N`ʈROf~Wor^4 r+,(g?e=|.P X`dBA0;h6ja6rE w`fU5x6L<&PIEd-{b eA1A _HRg?9:iB$i+* i ߦ D@ D}C_hEӛQi d(4>=7ôk1|[lfJ/k&JգZgV4uc v]CXfll+l]pNSaywV]o'M`GnEF~[}`xgy޺pJ,[LQ QJwۛgXXkVX /sQ%N4bimiёjp)X 3 | F|snu C{]qRPJ>w!4!hJi&{޴#Uҕ[n!ƉCӉ@-'S+ {I†:,Lz=oP)>R֖`$L= _ȨE M.Ҵ.bʨC\T7fس){"EI@Z*# ݒ 4[DCvCՅi Q T:H3wK"W '꿘U3'P4Wqdz`B^忚т#@B-6@EfY$(:CãHw¥tA2u{ #(gAVU]@E C[oCbiH( ,jwP"CchqRY$px5n{ĉcs98ĠL ~2Xr5dXQ:]Sx ,kfd4@updȃ? 0"၃lOVǺnMM4@(S33? \}oN7#~R8q<‡xLdJʕU;kEuw눰FdLoD\]*PBb_MkaDycQ@{o}F TEM/̛;|HKYkJՠc#o'#DP. %QOl\kDݦAtR_),-w ĉӱi5ĬU 3=ni{'-4aA%Q0u^Tp>k˾iR`BD ` ,50*k`4*k1JNrJt7CDnqaE;. uu:;ϋ發XalF)e݉@bG̝MyU_vE]\j+]2Nм`8 )ܓ)D3ѣNQ*4=Sc]kQ=Qb1SFܬJ b<FWp,A",dzCSAto TL\2EFDD}Z" ~wuegE">P @l}oz>[}z3^(a|#L5wxytZ޴QSD[}i;r/tӇ csOS%@iZF=E=>s9!S*gOWiMjͥa}\Zlkm:τǔZͻσ0>J R/Nτ4v}[>N،E;R/4oNVRؠъg0>/ՊlcF#RF J-ڈ[`Wr8,ElW%֤YCyޯ."rT~X "zGyZ\urwDie%Kg3oYF+dn_Tێˊ}\Or j$4ΏkT10iP{4c%f%jbaZ; Հk, R֛ F0`j+@hEL'zaV0kHG.Է`pzԸ]` Hb#_uL?o (F *1bVyk}?Wl>\gs4L<"0)/CjqfX.t4};Ws (IT aDGIV+l,F\%Hf;_l]Փ2v+ 6U&9PM]" (:EN[=sf]cG=Ћ}JGZvO,}%GiݔOv^[ ]~_x]oEi_lL5܀3 f:"1>&ֳ2dȠꕹL$Zi$,`5 smJjh 3Am/й=[30 ݸPmQl iL@)~sJ|p9q5C͜3e`"%@Gv0x^=1i׾qh) @%nD[U=XJoV ޴-ښ}iSJ [*]eQc-%2 CMݼvoZ9DU{_v.k3$,eƘDž (Ϊ,U2$?:J& Jф.Ԙ7'Ǥ<"Jo~ؤXu^hmz_6m7s .0̡L?  *)͐AC- J0H)YAjo>rsWuo%DZ+>i#7-+/kU- 55'y@B DC_#J@04@m9YyTYXīZ.&# ˚v]zԙ ښlh(~Ik7)i6?3OҢ: NgC3Dr\/˾HMF>ZES_ 11>%T4Db( AQ"DHA ! E!.`jNم#KEQUbEPEQAV?Zѫ+0d`DDT H0MRʟ˂(2U.udYnyxԢ8fÝbiVn$V-n uVRL,"¯۸`ԥæm:[o{57QY?I-nPMrs9N볽]`sSz)MSafdv bD 0TJKydAt4)+C ihãIVi.& D9e̠lgZgZJ"-H$DS?[b菣>ӖT\h:G7ǦI&'SAGCKdj.RY7?oZCX,O@7T̖n؂^N8eZSV (&/~/E -$$sLU0hveMxg^u+:fk AJyUƌ?hQ^:9y4un皡݅Y$Xh%fCf4ĝUAR,"X6;̳J-eM QLĸLv>xY}2u R\Ɵ$aegƵ˯r+ǧ䲖&a`uW-f'_:J@ ñRIB}ax1M3y{ɋT=ncNJz8(έQ۱2t\9L LҢVC7MG^]]EGfЅEM62@F *<،8Ct?J=Qk:9sZ9H 2zg}[TӮ+s?DΦ;eS7c4]aSk9CJx,!^=̇C=^rid3TO֖\@2FH2!Mz! ! kNőap?=KKuO͇_td2< ߇: ЯB vհPH$?j$ے@F&P@}OKG+Q>u~y, _/4&FE#A"~rY}s7 a,# H~{ pAb$AQ cH>YJBPH$YX#"EL3OFmX"~VP _}öWush>ϳ(8ICxfp_ޖIJI$Z OxkSAt+ #$H"dHPQ(**A, 0b# .71)% (CcG𡈡:*ѴmL3 1/Ӽ{Ÿ9Vi)^1[jb#|r;oF̺"|?%i*/CZٞoQJ ]Y;t&ȐOC46P+:onQnxTl-E˰Q/I $)6eg;}ϫ ?"OHc s)XbOTCAb?l?1 "E B akJZ#V˦h@^h+4raV>iGUUH`dj209݇l D7Ϩ *RnThlq@`4 gR(B̲f\?3Ye\L)˙7BhEո#k11Ӝ«9rh 8 ;H*q͔IM1(Z& !s0Z\s&\l BJ|6ФHr.sVDDf%,q%EUYa%̆CTVEnJfDn @9lY YD8 k\kIZLP7󜭘ZwG `YjSCC?kId% C֩`xq a6$ ֣ Y Yb q0E^c [70L^C lAmeUXoŒVjLu|zxޱpkC\y)RI! g<(lDN4FVN8c]u{jNЪ͒r ȏL\VbՅisvy`}6Sy|O}xH=U8??NR|#$ R唂]Ys ϲg㚈QIO5W[11ŷ-e H+ҁm4,LU?\]pPԉ3<~xSn F@PC#Y15l)W4JPo2V a$ETqpB>oLR{u-UVPytY6ύPLB•(M}!A&JidLkmR: e#2"\pǪd֬ڢ FVI !YEuVc!f mYy0DPl֛^F!ڕffT c!wQ%`|!R>2"vux=Z! SloL&83  OO39IJ\&5T`a'սyɠ&˙A/Oyj)lh\rzܘ%Պ[glG0]l1V톢awY$YJds+ &ٚ+[9c4[,*t ҈ٙe, !NPCR]pN;k79 + F)QwB5(-: XN{2IwRWiÇw+V X(,Ќf]U" .1hKe6bNyM'7q8:,fhh̋muY$v@awTdb a}8Yxyf>)D: EXo$\+ex 9: uA I44e0tXMHp@RV(e|!'운ĒCLXa9/ HR'V(`i (TQ;g6RI!Go1铷<Ԙa2()5)6c4uuZI'vbOLC0&%f!OPtW㛠>}|vs|75lpY\'xY4U(mjQtEM\rTC {rOQÆ1u&$񁔇p)ĚCՒ 8{ȚB a="Rw 7dIIvk! -`NMlI,05k|>5FtT+RNo/um5ԧ!P40yڪ]!ao)@Z\N@490( ޣ(.^d ATn$Евk|B A|G6 mR SP gk_!P`-Kg:߈)' nƒ=X Bvhp=1"rL[ȫ R80(tƵ F40)F*WUh]`lP*jq8J!+$QA@jL,GgAU:. U ,._dI} [:ŀ'[ sX3(vXHd6E2YʼNâHҀpDHZ*ũX#Y}lqކl#1hafa (RG*4ޱJ>CMDyG8lָ,b;D^Kj3h+gZ`lb8E d#ۂi%K$@gpϤ&#i A-6!+*3C 0&($[`/ v(?T}c3 ȡV?~t{i% Q.vr|*5h#:jvMe8{ma5& L""CazI_ڐtU@@)RwD@z?%#9`lY TE-4uҪٿW/!D> %0BC%T%T?gtVPRڀv2;r=;ѵn„o/`@*'D輩{ kB?>ԚV񱼡E"A셗Yv;zO=k{!4n8{6v3tP0Hn$ V q* gS7m5u>M p}j{l۫tƜ psgGC:ʚ:>#pJ DzG̶ $;7nURr Xb77S|Lk8$t}<{uaǷ04¡1IQCߺ_`47彝]JQ>'Wʂ :ZG/yބ)6is^l(EV; ?Ʒ C.!p$ \6*!dl@øN$h!f c ,bO`GNfO;# .I0[7Qz"C t "<؂,8TA2fOjl'0jt aǘŦѼ]/W(yʮSi ]DJcb]ru*>ѾB;&SpҪ PDhpveC uC$ $}Kk e/J\};tQ⪠f1%k"n<;,2c̩H"sWD$T3*<\oav'~{2 $s}Ҭ()KR'ib[dHVq['(wP@cუEڙt);Ql` #bd"U<Oz 榗*Q˩/(Բ螥LvѣPhЩ>5V&묌6AKXl'ڿ\b8G.`yln[ m3<^Ѓ, PM|b;+ҫF8 ɆۂA!8Zt(lHaO)+ P>lKf@RB$uPF8/Gh~/݋~D@7nC0Ad:&]țe)V^'&ctnԃ bTYCdbϑE#v-૕{˺Sݔ*i~Nq4Fp8otTƒc8<:M {췶7!2fdiL(*UT~DwAV}1Dr-*9 :.1v:9E& _ݭN0Ⴍ+yL ;M%bldX z.;!Cb$"@)/qfSTW⬌ T,xl!Ta9q O87|9"ւV$n4Pѣz5Odr h70Ռ@V{n^ab́ݴ2(Y,$'Kd!%v|]@Baj8lV)ƴ^1M#kBׄĀ"HXW4"L<o@Di[|L*6ެw 6ŏr.*b۩?l-RB\UGc'K2Ak[٣?6iFHٷ2",Pf^ Ɖ'GY 2#LL$r4l._TֺTL٘& 7?: 1Ty+ߖJ˙L庨X實?=s[t#^/3=Fң~GC Jª[*+)["ڙ.%P3(m o!LgbKlr (m eeѥY,eCQI3!Ct}|ґ鑢rt* 4C1q/\ucsx[ mf "%qP_X:uЊ( P*n0qR B\_$QQ#T,8]xQ{KzZLྵŁ"{fL]A2Ԇp0₪7;thGYoxIX~B@w埄=pEwֽ?/V и͟K7j`RėG2XҫDFR+*lGBPƖH&ݫ$`U",YAE*%rŒd(6Yd'`]k.K,]61Vd~UA9JFٽYژR _2Cz+17juծYpUNtwbVŅV~U4jXi?̶?ɯz묒~Z`@BkX$"B)߲:zpO߆v9@`"/kQ@e.eRi-CwE.ů& 9n_Hf-0rphHWHB8'a_·\6 $ ?Oo{u둺4M? Hvzfvj~Lm,/J3 M:"؍ 8>r? 2Zjsi &C- 3t~gKY|Dj.suPOF^ m/)0;aӧ S`~ D~PCGcs*FLχ2jvs[8l̕F)#NZD0ڂ)K`K0A(@~ִI!L?_H`ϯr0A>>~8[&|,ȳכ8͑}A¿G™ S~s2<;0 @c  "! #ܝRl' -!;fRnaviԓJm"CJMY!M e:M$''JS ъgYC,5-E>?N+կs:|g=b:Rc^e"|R)d|0-9놴i^Laf6!rRUAW#6G?@*  즄&En2^Zwi˛J-2XwS4 eF<?tƂeSK߻dϡ6mUG ;q$vj :]Nd(0 h,$YLOL~,hփLTkA8"js&$ ,`؟uL--\5t汇jݤ-*NĚIi!.IOG :u:3Q'Kq3P=Y3P  ?P ԁx^.N[aZC>1FJg8Y<~s@sߢlnP % /t~G.Q5ސ`*L4 aنk1|쮿K;N~LDD@O:MFA!v a~C)ϐd\ (əCPX3-sB?.YSiG+7KDчԡ<*%u9o°}~z5JL>wP "QAY (<%qKyr~1|;V,'LX)=D`SfVZu_Y$t]!n!,vXc~ }L|1h׫_XkOfjl](?{G:bAh_X~2@}z`#(I䌄fu_D)~fPxZ_^uۨPfi3vxCla2h"C1&zst SɚXb&i聆pSB1BoC ,6ӌ=nɶLq Ba=&*0D"ap1x&Trʲqg VCL:xCN|P6|C3i,5x k51@j|,)X*)&Ns]$ef})=w42TC-ĢPERv A%eBiXC)IjtI 9dBH&[ `&pNwwގ<3o4PqsI5י<|i!F9E-0̡2@ϔJ`2KE)-S3E !>\L&_E$폞XN=&wPS,i&-28a0%̝C v)I'HwN"C)l8~LKy1Dfm=0gB{a'hyg*[JsF4czEBRYPBe޳{yfv4h$d% mP)bR W@Ȉ|jChfd.蝜 :EJ@Ą =z@Z`!ĘBHPIzt]݆c1Cn0$ukarX*v&j0'=ZE3i{|d'9ABg |[41w2|Rά;Ѭ 2NҐ$E6f]v\wçٗ-1\3I@=0{`yW|2lg,.V^7ݓ'lNwL$&Q 2 D_~(LaȬ(6*䬠c O3P4g]S`r'vCc.i֩IZ}/Tma0DǪhMtTztM9Lw7C 8ME/8,;ujlѻߟwT 8’JEׁnpy &HyI!b;镑CE'jbrz) 3HU&|Pᄷ+ SwDI8JM| V|I}cM/LB NDiv;ADĊo ԁ]Q)Tֵ &T3.hS_[aiuJ>r™!nrz|+Ǧ4ߚCtm1 gwt0%&uEN0I0 7LPXv:Fz:*ɪ9C)IBC/"H(gg`U&pΡY^ 96Q0J,B]<" Oi6R$EAJ@C8036 I'oIg0B꛹hoX Qu0a >tDc$dhFɎzE6b ЋAq/veV OC٤Bt5!ꉮ\ǜl4vWu- y >b3L3H`eaV3~X{$"SBKLC|TfHU`ZPVjJAĤDDAI=bbcF/̅c"1DbD?M܊u( Ϭn]J9JzT7T'3IicɁ]bL/A__;`瘵ᓼ!$pxŇ悰'kOܶ( <KDNe杝=x(L3ŒY=yqj{0Q;r.I&'$KVZ7^1bF:!A[)}H)!ǣJҁ@iшo E>T욟Cn*Z+C!(,VJv'+Ձ6:Eu#D&#5c`.B\ "`j !V-]Nnz~_onExzZm%%uܼeH"P*)U5AuZx >A V;5DE .R^P&.eFK} \!J!~/?S~ A~,[@2Bi6|)$ܮ踋(4%xJ7[1纠w"Š 3TJ΅%K ƭւ*2=LAB;=rĀ♁@toPM^R sAdgW< xカC- ԌJP@xsye҄VKQ]7OEw̫}@PYmL`C;o$D*& ՖP%RjxwZqq6%ʠ_"+[E +Qy 9XUJ+f<BZUR~ ,3}Gh} E24cg$(Ql-ecT!:W.$26KsƁks Bht12i~ΡÈH{9.gcF+sw*R#_\%Eo"H[7W!u0y#Pzw[wL&F;PoBdGkd LQd9j.[&YKKa=c6zf{mEŽ^ O b悄 N4K! _߳cダBFY_D_օ)l>ʿ|xC/w83Yn?%[c=tce!HBAdWrtE6RaE!2Fw:"kOq>?7Qgqvqo BT k|RFG`jFR;J\*~UxMSH1CAfDF5r,'ٚ< (;쏎a N(1A\;[a:vL z4HOu؟.b5v+Z mrb@ϦhNߠ yJ%2-P&|,ZyT.]X /ـ.pP"yHh\ $7'Kxd"d`IMn(/H_)c93 R\L bOɺ$-K'{}9nltz,0Yr/#D _*bC?c2b F^\y/DrNÀx @LRSՠr'wrPI@4!]z B::5 G`i鼐".ԛoO_b>o>JbwH4|D@,^SZ,Q\4:J2RK|Eǀ5%L g~ [4hw1sV6%k|X֬.x4r@w?&N.ENʦ#@=9HEU384"ư Hz[o={#36K&F=s>!w]qfm2އ¹hom9/:Nq3Z2L[ .5յ>xX @0Nb|%[؂ E]w5c Ģh M!^T)n;GEM֍BqAd+RTuPP%!o-t)eVCXOfꋫkcEמq f㱤i԰!5P| #ǝ(oS с8aJ! 6 &k?Lw,:g#CD8E-g܉A+BH &$3@c+0T@#I:R*+ޙ`N<0\A"~33I ADiojԆd3РکNV,rT*U|}V27 !n ^b˭uS.ohtκzI@rPw4F\g/Cx?,qΦ4Ȟ8ѩ.@tӊ/^.d)h|[c@j8fTϽ aɡ-x,@}j-PV0ԅ0q>n]P eٗ #D <]ZA2 YR'g\:MR54*=׏RR 7$}}"KL7(*LYEQ!{cϷNMߦ^AoKz(v$?>h t 1&rtqY&~?dl1~Ĩזhs>\-?]u CD護:C1'ǙwQoucַ{"ZETv|f7Zu@)0ʨ:"I3#,ʹq[[+.uf9 v5GRܻ*#?>~BR>ċl$-m}!m'3 dIci(B5[ dĘ jDHT2qL՛eg/(Am;B,kEtM^+ 2a2,m~̆i&icͯЍlBA$%.4Q٥E{:z-¬"r -HkUc[](~} z㺸~ s#:3NjTq_TgWHIoHϾ g?vCb޷a۵L-5Ȩ nb lI˾0&n"JT0Ol H[ /@5U<]-B@Wp0mFP"M)vSW[m>.LӐBDV5Uv6V4` HѠDKYb8u_LX}rzh~{VGBmnEA:U`2:lPFzk4HM{nE;lz뜍йE}wUOyyQRaPu~}np `)(F(ڣ#f??gڸelٗ`膭xYI xaD*RJۛ^SJR" H4@[{'B@b @XHA V* ` BEST) ȃ$P]WLߐ4d  ";Ho|^GvPOqO3<(=b=; րXľ|Od а Ÿ@xW׶`>HY!4.EņޕU'J$z@@#e?$d,!?+QZ,#-޽ak(܌e1pmy-+!Feet`jp DӘ],0(45`!.vn& ՠ ?8kPq[K 2hCbbe,VE`H) cjWEKm4Z̹12%07f i3o5ZlN!-&Dh2ba(P;y DCOQ3=-\Z-` TXg᧻,3)`0РǫV Xd䊢0#uJ2 ""!swc- K-!JW .[,\.-E` WM0N `\ {ˠF+*8Ȏ7uIRdm%R?:6,^Vi{b,q"@9O|.-آ"mc6T񪍶 q9EMcÔZ·ZR̨Md8R\`렺3Nl/56&q m`KqQM*nLXm]40#}MV'(z{K $m%ÿ"2K{4bƯ27^T"  k.z =`I~ OIA+q/+v. yP5lB;kqȀ#D6BT(! -)a"ɶˤCt9#X{8޺~I)ӔE !f%?Fmb!ag[ y7s[B1$ =_5[tT/Ddlk&Rz ~(PQ]3L1-wde:}G4k8*-zK/`PA_'ۏYT;+IOg[TSkM Ӧ՚i~s;8i_鮑@Vve_W TI0[ ,J3BS,AaU` C yn洕 #TZ~8Y ]ȍ0t*@L`,!*xo~zB2DՕaM~(Uj['?c@>]٭ `t!}m3,0ٟ&b;`ԫ#}eqmؒeU"]Wrո!TasAx ~Qu\J(`ZYUfc Ac`~*J+e`+64 2A (2 (ߘ}S,|#14`;i 6-rhY?[EFC~*ZE~u*"az'܈3spBK|]TƎct¡P c({%c?\XtBse;4@ JNF90D` qAmͦF" K5zJts 7r{ 4MV y]e }V+wݛ t 5 hfi'`ovft`Ն4CtP4|q]USBbp̬6y6]y8̉ɉݠTcrՆ0SPbz@eBhe0M]d]VŶ7Kbְh&,fօ1 y04CcY1檒J05d3¸Y5i+1`i>5Nn&ڊN*Br$Йu:u2`CEL}0!syD6dx׭U_OLxj17lmlNEF%Bf' Jdonł ։\ H`n< m5Mf:hi "K-ʘBK C%ZjYUth#fFRholr. (HdzkPA{$ڮJKE) paH& A#"aLmD )1!ZA]0f--'VdY[Ll6m @b;C8.Sȥ{0;a٘1tr#g:ѓ8:k(|'eXP9lC2Qq&FCzn#a6Y҄sV )* Cr2h+XTH*$h STAo0bnj kLRYn .դd  v.5f. {ZaVnK)R"*.&;4nf𶃔t𻒃,7R65 @@28 [kkY4M@-%x ݃k+faY5j VҸ˰'n#(p*D*.dPJʇa0;d.x ,S/a"tIt'LHz}cnиƜntE5abM#sMGʇg9e;x, CziXb I!m "m ġ$75$@Ot+ֆy:(D]{'IqgLl@,}8MeDY403aR1KI).]CqKtjXfϋC`^ۉC{a^!FeC4vN$UJ;+#IaB J"NKt!^7Y z'8 Þg뫢4#%SKHʁH,Z3ٸ6E$-Jvw9P C$&=&2mݦ #I'vnBBo[Zg,P||fSb Bwn!bm$'$Tɴr¢0j{6j5sz;uHMu92YX]`aA VL#n PnM4ᮭD\ޛ|e5rkVMVevb]VkN`ٚ Z pZjq6Ps]%⛥GKL˷NR3c0:yC$XKtu0/ z ) -l+!iuZ3D/.оE'j9 ^%Yv.]X~Ye&:C L?ꀜ=G32i !!+2i4)i$ `RK}Plt8C i@HRPHtV,;ezdi;CklP6!yu!ho!l ',4ဲE,a%$ pfE:isRm9@N(kj7Qp/8s\_j!C B CS/wP!p*C'QXO-'H 5Փ(wꍎBe<UHtm@TΨ5uC3֪e'cU Lbv'Ubu 0-lU`f]ApIˠwŝn+C(h1!I !,Hswo)> 'zd6 6Ý5D?!74qy@x7)@K7{v6z>0'':13[Cz`\C. @elzX d $]n\큊[4T4Ф F^SN0II@퇟p8 &P'ieptáe;0C!51pH!-' 'mݒxMLxaR Me=,6$Ô-=fe@nM3U6}WRd!M|1vaB2 PCqGXLM c1r E&UHiYv0凛̳&PLM)Ё&[H) @tX ݰa X@T&ՇlB_rtX=2iۊCP7l2&Hd6c4S묕!~b0dOtd=ODHs愞2M&n)d5uܠ)!۴-&}Q4m%&HSd/6=&5AHmi)8Z@I;M˗,a! ֪Ttr 儐|XmqP敖, *evrL- o%Dzw@u]0@0i]@7+b;29i:@ X[gG?Wgj;Bߧ "-TG@q!jA53HPw@N%I[\L򋀦HAFqSN+Jj.9" @r?~9c9@ {q$*1Me*8xPp3I#x!"4sf&?Ou=fF=usv@*":P1x‹ fBUq^dW4@ ڰPS{b&uyA%ua4a{pp {UPdŦ+lxe*e~륤Īr׵Y,|L31J>u4lCszRϱ13a@*#s=:^+$㪡2@,4𛩓ASKIZv}`pʪJUE6"*Dr>&1qX  A`D+PE $ )H4 ,bڹc00H!|1cS!T  sxݩƅ IH=ef `$`#[84DwUCh>h~?DH1$"A@bE(QP#$rBx迟m}ۈmfp݄,\֧ʕ*rTx"fEu9&8T@Im $S1dayN ۂ#ȋ(NYB>m 07gZ0|[n~k=2ݤlxn1RPA;^V3iIC._)TA^P#{~aaxoSY|7l1LjJ>^5g$ OK]Aj E@I>lzd1h,Uk! ssqD&Jdϣʻ*+w&)TF}@!K^\ WuBuJc2|^~"}09O0HnnC dqA!YgWoE0w޵(%X>Jx0blZy\vHuՋ_EOn qz<37;{o2Jɏh5JO3p%7*e(,M<6 n8/ZV.$FҲLQD]5o-(d5k4dUw0*ys4gMҠ*te kD{{WiXjvDj*N 7/)>@#ah*,#.ְ@oTЂ2O? = R>A(0|Zc֩%|L"~9Y ZW`2Nhs3,H:f@񙡺PrS-~8v !&rǰ1F42= hSH% $C:NOFM)AEH7TP(> oykWJ W'F" 7iq Aq8%3aϾ2eKDVL3 ^:c]#} |>{6.V}Kw$gM"Φ{#' ?'=4(T7c#H4ŸCUz%8hmUXUNc"|bQUV6V&XnK`P** 8Y4'\"BZ@LX z#JŅS8-0P$vd?-kyJB΄ qnrqh`ߌ]K`P>=ї2ܽS BM;xtu2z C~z4Dta}$xt*Be-LD Hy9Pcwg둅³"˥.)Brfm#L"8>>1~G+3C44agimYZgq&GoOQWv(ixz+]2: xD`^! TgGU4+]j^*%/%N6йqělfzg*>8ݧ7iֶM 1^rDq xuӴ|U'UPTopQv|DZd h"|zYuDŽbvl$ Ic,`6uS3)2OG$A~+Xlbe{-6"+qq[P (=wo:iw!BI4UE>> 8d`P/޻9wt(UgoJ'>hCr.a"@I"W"&ɔ9"$[ͤ״@OgD=yf|{\rB 8"Ȭ 5CY@tьFM%dD>RGiB4 uHy";2.6<mw8: R2}9,,i2zlstj*>!\?ƅPlâwc0R<)/DNU9^| `Xn0{3'*~J/ێKIIVT, $'9uEX@uP(}ome+BwE7J&~Pśè]O[HUA֛րaFy|/㦛|iMM) 62=I> Z$QtD@cGt**XcZ@;ʔ1 @]4"ZA Wͪ´w⇸9hXiT7"Lbt4K3w ŸXX x`VE)8צy\9X4V qEG#1 8PNHъ$%Skw(iS7\y mPK-b?`f@&}ߦ vD*!׀Lq(9GxhtՇ/d]?f@UA_Kû7*ؿa"-"f.혡`⛡0Yy\oY˝\T\fCF `Fiͻ`2?0*ϼZ q'U^47`s*OFwO9ӧz5x[O ~~?zO\u_N_Av~UX&-JYM~gϫC s!$7!i 걆15_:]ӎ{6>56:tZ?mƼ_LpPe IEj϶,.D'!-#|QZ'5(G'^ ? 8j 1C޿4uZ#8dT)@U$D v8%aތL4ovCb/4CEDQnJCPO&~5 `D(ozt-at%o^ZG3 /z e;ufZ->Tf f@vu1LZ3nwu5]({aŀ_Rݮa_頻 ET)Z:0PDT "j?40G @!dΫ ?.XڒV( w ,ξl~/:>%Z/64F싱_ߗpmIInn\L@j8D"iKh$ B%4ŏWz +lh$硇btGs30\YE~6\#lp)R?fwݸ8,Rō~5S!f+JBΩcrZ~3wS +%פTP 5]jUfsQuI h_Lؐ6@R>Ado$n%}@=<@m ѡ|_Q8,#?BQ2CVOݾRo+(~&6őf(H4(E}?z 64CtʪɥJOWKTw{aR 橖LᓌCMCk uO/mxxwL ?Տ7im;ld~R`\Y@(u0.Os~o}Hl4u/bBڷ_TwU< 2 4mu0ꕆ6%G]M}[0bC6ssFZI%vPϱCd/46#_q1YaY~{>\}\WQ'!r/`h7iϿ:1`g.XeǯuƦ| ?KzbDzړӾ{ -Y`A%5C{D3k|60 i=sawwާR&{-iTLe9MJ&9mƪFM56{>U|^l)zƎ;X /*&o-َD,e~h{޳tZK+}k ia#Q HcTF0l0b B{g2* F^Qzp?mtQ(^ꚮ dr o_,:r hj%l[6m=~N{O Lk=j f蒓l0mD㊞I 0Y $Cae QIe&N+\%$L$;u-$v&?T;{Bz`{L%2JBhRV@drxm m5E=γ^=ue'zC@HbC(&ݠt{i> 0""LY*@ݬ JwiҲ=LQY':9;zf6S4 Uc`m&GU%&e6ɲ {/" ymaub٢Bŗ 3jj-AL Nnm(+!4f5a{l La˚:{&'m8e;`o| ,KD20 IˇA3JyM=f!P$H)<ʭ<$'FK h9PWVȪ J(=c7@9@/'LދGľ4|yٲ@P:䅝Zs|uֳr|u{S)~\)+b*O?PU=li)C=e4@QCi4Np0i>L?>Ϯ;2U !~UL>lqHNaL3bɴi%f!>Wwz H_yzN30hчm͖;>.:$ֳVZ^+ `3ǖ mI:熺x9OJZJ0z>i >,ٱV 7)0X ica~9jsVDLdqH b2 +c!dvMwS'u ![ -@05y~:׻'=!/֋~3[ zY's9޶iȉSИô)ZN1)b`n !\0jߚ)P=?а!aumY Ft&/,+ukzp1ְEa3P $U!N7&xNXKNh:ӥ+NLQ08w(9'JCJ)"͚I'M2|C,}Cc&r!ʚac&v7@mQ4z$U-& ;{l!$)&Ɵi0꒼juD)OD7Sn4=st,A%5LLH !Av1q1ϋLJމEk;B4, a1 \$ HLʁO1SsMH`;s.`V1;֛"9UX +6tN뛵EDBkπ" k>e陑u`}Ѝuqk>-&;ua9Ő חU$Ua0(r7 {dɛ/&oHm<՛܄1g&wO3^7D""'-4hI}2`Iu6XzBʬ&L3oXn +N04ńt@4ˀUX@d\T'H+2Md)b|6 qa !k(w+!LM)ah zN|ya& z Y8Θ$oVCHf"+CćOi&lt;q "/^jHd92F F:`r*uX(ZeId$4iT=")м'!tai1q۶j~SndJjSI$&?6Ji6s] f٪q&O}QX qWhmhO`eBP &2Bo:IRPCol=MoY :KagRrzKx6BOYwZI$`mM$:Q|T"3cuTSQFܲp48PВ,䉠1 8狁)RvH=rL&0a+&:a7&'w9 i!rnl8@t2xȰwS|/%!H.:i&nblC@'I'4,28P%mm9O:HOv:@>tr$0]UJa?SLS& <51wOJ=_3`rBB[O D9267fXۆ sz]M L9L/ `rwҩN}k~߶ (:ß0 oP8f:W^Nh7cy[(Ӛ -"Tz,$C(UBꙦ6%J:=f|g!Eop %S%񖸌Xi)UCzz#v;ZxhM 'WcVݐЦPFH^ˆ^^e mD=`]( B%s;X3?L;'@rV]:jfH4tz]uiPruxC !~!,>OxBw4TFMP ,@`!t=aWN1|H6#~^ㄋuIb,`68c djI'c>"IB  yOF[F:p̧`xҥ$fXV;DBv@SQXV'C7 VѦTݏČԡDOj(Y[+[r%Y1gSa 푖7Σ+PTA%Ǐ ;5B!hG*޾P14=.j6@v D ˄F}诩=h'(3TU"(Z$qGou`\;q{CpWwH6W~x*` d\ hֱp3>|_o煍-Wƻ=7JC"ƽqO'h й.$Im_}~߫},wKq~]*sʌe) /nwgjVf##m!KOm1yL[5]j#q-LXm{lO"0DK|LZ#T Hn,'+ZT=BI<>VA+\|ϟ(a{Uʷ>Z1ne("i3@S@[ڪV&)a;´Ɠ^;5% T23YUv@@z{ˎWc95ɟ#z@RHE%%quGUew$8 Z|"5"drm[qXxG{+! ׏)qkhBK RBԺmh^i? Cr."l7.,7ql<u03{< 5t֏!8$$n;%o,"nj'cPεz7si%!tn CoŪZ;LgfI_kf0@̌_H$QS7S}_byc N# lMtsSNyB jPhka\05T_}|0hLeM,3_zm$i1RKX KdrI9¡ᎻǭH_/um@a(I>NHˀ)m9I<X|D-j$ jQCS;(Nm7v˨,$[Ż/kWD\:7H ; ˪2h(k]6M:P%؍C![&h2,sT66+D~Y>ZJ{M Kیr+b|[ u)@E|0nqu\xҶsK@UCI_`PVDGΨHGaJqP9!8 m5{`Zd6W!(8 ?S!4[!}*\79Bc0<ʜa)>y2xT4Eey\$ !/}sоnߙ.Btđ²b|iM×FoB t8EWF @O-1$nƼAU-1;mq_96Ȉ8/ZUzȪ>1t!*x`7SlrvP- bf5 F$ۺg)J 2|CoIL&A=Mq%Ayl~FVE{2fE.D_UC57WB8t^4Q9y}:Q:UWd ۋqN` zMS\pHa7p+jk0t mrX.Ŋ"Xx}3Q뮇xnK nbg 3?1ʪc/adX.|t|1zfC^[3֒оeGfEBE Ye v)-Mtt F\똏׾?MACحL9S@$ D?5YOL1(\FC]hQ!.nɩ\w31v҅#:ۚ4Ka邘)&"36k< JQ"FX'el:nn T-g{Sl*|I Ȉ] mHXN+6$fT.DaQ)7Q.p{d;ln'f*ذh檫[/:Ofk)$M_Sg iPSECiHaA tzqlb,7wz4 `{4EW8N8N*Ob--(}haN١mq}ƜZ.G\ C#=4N~'[!x<ֵM.ޔNYΛ'mN…?ѵXC? 8k k沨&~%"1+ӹ!}!VE v:'%QVHgJqq>?GW17Li!HF `-bײʀlBrN0og(G.9*FAa5oi,B~W.,M٪_@2sLh]`uJ/j#E\ā!o8/[h} 1gL?FFا8[@r҅A:V2^z~~vqڰd$)߿֗ҟ z|`u[> ΄#SmM[~ߵL*TE9 bRn2$dkt62Mz;q/@| UT5Ud^s w Ȋ342_Kz4DݷD4] $4D "Y_cT"PDikF%tM3Nǃ͙ϮxB:P0 df,CXXL899!zXZ3DVLvl(E$k΄7ڦ:„ -+M`&SMy81CV"VW;eG"퇀v?v-/OJ[$@WGW GF'Ȉ4YcJ!l}X0Uш,vF4A?ه5mܴWq>}n'DpIMabWm!dj5?tyc[' 1$Bc7I,4dYN7@p1pOSH~H#&kK\hI%f2cabk]kZ ~ͿU~h'Dz eg" }P@TN$i7 M$̣'hM>P6쩾>*,-n8Bk,,Z9mDI)G|^:ӵKAC7~s iz*>.&nA޵CGGmH{UgJ~O !I@!"@!O_5݋22AuiXibPRq }ڒ'@ !8{7eOْmCVD`X5(403i'̻͠mP"xPO U Jiկu7&$;=W -FV I%-H=H0/:IkfR˯p6to :5tsXln_a_$:BqI9lЀm@52]{YE'fRLgL'u=@04roq"OvSCt"$:On2,Hnh.w_xXTOBRJ;s͎Iү_ -춡h'@k?T#ZP{?9M{ljG'6N&fuN3j=2ߍVO?gl Nk?{)|tnrȶ$Ge(k;X =l. ¥YF 7~{GpXTkeִ#H.n'I#a@2!c@:bDN&Br yjzm6'!Fh8pđ4ti.PuQued CW.d ubVcp0f]"͵hb2j,Ȥ`knfKfa:IifFن@ :N|8e犞t{IiIgp+Mc9BX\hcviMFbsSgtvK8¨vofA:'P_cb2e9񎰈ģ IXaݶ,3ߙ$Ya24˨fIS]H֐4e5{H5/L L!qkd$DA[$r(xlʧd=z(v'`!MU 6J緀e 3YE)eNRz5tmpIXJkgXlCbWcY{q4qTs0yNrgN.ng5X[-6)&St;a*1:7sSrn` 1^/F’|mA@"ݨ TwW@s0@ YXCHw8e&M"v}K@h!hTػ` @܃& u T*@&-+*R9'L7ͱyF|[LC Gb"k֎@ߪ/PNV'OQS:ʈi/ѽ!4!ttr*`_ZOԎIYެQ!=!̞@=3yIEИ7֧pv"8 bg9t㬤9CHQBb&cQw2F󼦅H)("OJN t+]M003nۙݳEiS`D+a q'⌀+H6hز *'IfAeM!IC-@+ \ӃQ Ye(N6\!R)$]pfA 2]aH12E8B [h3&HIJ3;↤1%$zγWܰCTMaHz$`/lx:`M"!hM# PHI0EIȆm'Oi8ɿvH8iilzI`i&ˁ'oޤOhm',*Q2g{2C&1!I1!uMUCm!:DKd欇~5@5u ax}WvL0|Ai9۵BwHiqN&U$$*bChOv<$ӭT'wRXzvŜ$&S p8Syzd;0 * {Bb *T3ĂOhOIk6Q! 6Ä $8a̳!lxWXzxd `Kg,sru:rWwd0:@;|NmG5@;a;~wMsEjyA8CdCT2P7j{ lsRCѥeRf$'^ɧx2a =>N:L'" CLqA4p 3lT`iii뺛dt\޸흤;M',;yd$[ )$!-p̦9́y:&ܰMjJ4l o q 8O߶~d,,Xm'L!u@N['|)X,骬_VIyr "#9=2i%0 9EE@;aND46t!4.C hl2 $iO<4(c纆 $x;INXx(< [r)%)h^0Oc!ֶв$d4!P>r@dě-c:CtvEid2FP)&0yp״: `-.`ʲrsfazĽ'q:5}'yeS>V#XW/6Hr]#*3~̲P nԫ2  Qڡyz@D zܪAqoNY'`I83tXCi4K.֋.X2'`|\;pS4a PFp̺H HPt]H :i_軧w6;m$$TC\ZL$R GcOџ0Jsr#~z|RprlLƺ `C W>"<T $~]P YA!j\-#uy'2Hw*d6ɭ(.I:D:#2>4#q*eŇEjyN5g[pt2]Yr` +C9ol?xǃl}1mq5&Ut '!D _imό|.տ t;7^ k͋]T~0POR}^jL6DȐhW[sA&[I._ x~ثm\(\ĔfȞEG  cˬP ^9Ma.!A}(Xjkq}84Wh7 =Sisd:$x9G.Bow>'k u;b_V{]|3)\yrPg=Fp&GZ˲l<)vi Rv+(7cqj pr̪1C4Rxc7RCI4&5$ֵa;]EXD^c=NkF / 顁=iy<}qy]r{.ñdR\<m>9!BI٤KQ*gF?Oª uжظ8OV8>''t.¥cƼ;Tk$mFv1E;g~μEnfv6c2ܑ@SNw/stAE@wܖe3UURv'B 5#1 i֞RkFUǀ0 ՝o\LD[R`pCL}ANӬ_m+qJ`1tA-wߘ&SSiMG!܉uP4EXhVm]^PE#'OP%[nd3"O(uAvcD1Atr )+EcSju*Q {%c0Te;SzE)ו Q7f iuGH"%Knwgށ#Ka0;}x;(X;L&,%kbpGy*ؼC]D rR U2j?Daw{(Lk \EOTzv"A/ca ; z|װ J7!j1Vr&b; k ^)#[`ّ/9ií /tҒsҥJS:,D i=6eIP!گ1.IƄND17S#.AՊ0`ػr" тf>] ;m1y+@vam x8C]sP"u݋N VتffTfWQbF,b Xd'&D6+*Y󦶙*:i\r.zD ћ]|<J }g|v]H}:)Mg8!mbU,tК]ڡn.Ks>j7%RRH+^z7T&.̵kO,4@]{6Ezςf(~kḱeހH .o*N!8tկִEޯæaBoBlRl"ã@ёJA e^ `"ڎ0Ǣl`#3WJy^ЗPB(iazr7<7˧B"zy+@(QM 1LγPwv{@b٧)Olt'c G+ ,N|짙B=dQ=FzzCYYv'I쫰^O)DE;PXp+DyeyDE"b8ii$6ϫ@jn.WwxdmџMO+AE%`H6~i8$Y td8υ՝&m1$J4 2nh]C3j#Fx=ߪ(zy>y'+γs+Ġ (| {<?nh%C[;XA?mG;j˲ҙg妅Y p( ?|]YG&ufIoa?TP[?lgkI MN2P*(g\fz@M3dɓ_]I;1B E*k.uhcpv0IaD(6ӥ$ ECֵ`ܧ ݵv+_r PӓDƪ_۞k7ƾ5)/w?,o!9>m }{ yq)iU¢ Zd 1K*W`}sO]PݽPób~C(ڄF Zh7_xХP1FC\ɬt1AtukH7IOvr쬁 D4mS[ y!U]':*OMs^*ⶱq#u 'H%m @Z{tQ8ֹަ˿7 5hJj`9ԆH !)*FF$?1ޙHO䒿mV i+"5iYE,Fȣ'w['S[F/un,[4 HFA(P=c?k ec(ڕŵ,U shQ+ 7c=B R!wi)pCv`풃/x Fdw2+&i$t$Рfa gvWؒ*5(˅KSP`džB)3"bEaC;f1T̾9ΧG("1l$և0D$E:%?~$wvJN͓_wh~KɲGǶD]_A^3wp"ڬlJd(BxXI7!S^wsp'L8tyn', L-FK z@ hԒ?<~ߑi΢#,Aՠ Gn>+NfAhw|_[|4c׃'ץCx0aAj^w}/3|t%'JtE*f`1 Q(8Iw:u&뫠M=L8 cshItj.38ɸg-PXƠm(aKY*H=SkzDŽ҂b(A!cg-Mm7v&R&VYh wKXJ-wÛ7 {fa S&s,mPm$U)K]MwdJnq R@ $3uTN^jѷo cFōާ˰oU4GDZAB0;`b,lgsZUk2 & 0P)ľαdMvr{C2o`|o;ҷJfdp̄ݛhz^u;1 3:dl1@N+әp1ۆ}wv# $fՖfXfzNӛeenu LM-"h(er#OwWvRT!Qc@dpӬ1oiTsDutg-om:1o.d]Z|uwS3Ofo)"+FY7 IZE ny[bs`p6lzEۉ]5QzвUn=bNT)^r8^Ux)9stȳCM Q1Yg+Z6l^2 Çy틹r-,[Td[!WQEs̤\DO\8*܋SgoIw֯]۲yLZ'.i9.ޛ\mnf˪q8j'[E4g8u+o_VU_}F 8.L6s>vOhOq @= h uIf}sH?]Ic(u<Lw=kL7CmkNd{qL.})Cu+řuHCX'Xꚟ}IqGqYŤ-,m$${ ب@ :'zSql)/tzCIG;o(Žg~_7O>z %ׯ]xzdqתp5.i|| CSk6S֫Qtii-GFޕ  /(h]#$&'i:â`ATu (Y&`1zf<@6h&# Y )bs;>6.S, ʡ.ڷvzC"n Q{ )m IpŹ4Uo.\gе2"D^Jrr']z{JRr+j{uˢ--H!8;qu'ЃHjv 5%Hѷ9Vǹ#҆!9=Ys'iicF`UHY,[޹B95.ws1*koug't1&joG˝sQR 7]͝ܧpV]m1[²A7Uy;mαm&'px Qouyy.uR[z1jd٢Y׋du4I[;;WH")c$ѕC2q@UFD⛭: WVg[#R܉Ҵ]R6Ű@UQjt-ÉA!yߏ1ai oqhR)+mݷjը WHN00b-݄%vO?$~ }o}ʒv>|_Z?#~gL }>~4O?~y|o7jgr>$i?gc꿳aޫ7{^[K,'7$|S/O/o9{n~M`߮ moˑaƏ{?3r?XkH,HoՏvꞆw#g4N}Aa<~ W{z;Ÿ>>BZ 5O/b?jP/l|SE=||_7Ν)Gޟ~!־?}gr^si}(=Ԑ]6ϝL?R?8>O^|s/p22z_ ?w=$`y <!G]'x~^Պ -/g0g/cz|?[ 1{ǾV#q_oi#ކ{O^緑5Oپx޷޽hA~T/2>L |փ]ZŏWz?/w>#wy?m~W۸mk|i}*Z|_Y5;,3$|~Akr ]3{K5~_\k?}y?K?Kkֳ̓s}0◷u2L#=ѳυE/Z`?͇}?O{ _tuVyu Wvy7qք޾>G$i_Q]c~OmkY?w??$GB_nKߣ!|-}u)_b#~k~']{ο/h ZVM W>/~ w_y;EGjTx=X͈QG0?ܵ _vg#|8?/Kzoճܒr|I _5? >_ik?)+{8>2Wj'}yޟohȽ^/Χ?b~W・=_~, >HOkll_*{3yuC?,3q9(>w]|JOȁq>\G~hSK;$k~wH~ʿ<Gik/aݯst={n>>k/m"A뿵ύ?x~hk~L贽{nOވ{hEշ}O^Ɂ o0~VN=YOwLm'>m^P]yuGi8^%'z{{_<{>۷}%Wzw~$VOʁ @DLrynw\J&M WGcn>CzϠ6]H6ٯ6SgkOʮǴ흼1}{h~I*z Iǧyy)F ճsuPrRtY/W> eѺُ܇]t9wrC ("03;Qň?ȝ/7X8FuomO_M[H7lǔT6?0y>6SӀ~jT~_Ge#l;%e?XaEXzt5BUnos)c.N۹LZ)4e0e$`rn bR^$(ʴP6q+yUUK;޹-[eK',iEkfr+LXsSnn,Xq|2^3j H82-SՑoat#[JC ]G ,1D;N^FI FR1֐sRlwCLO{lu&e+H`L1 ʖR:ݐNإ`B1.Dp)˖**Y5zzѶ.jG*F %"-wflbɅгR VK eVެc m[r1D)23dQar !c 8١D12P1Qy!<.ѳID;@H0Kde qL#vn#1 38gSdw[zEH0K E;,\g$LZ #H0U  mUK)Dd$\&wf"CO&I9r"Am$`bB6iTrrT:!)G!T E<{މd-'K`0!4䲨0Tm%_o- i 1 $;- C&9$rL Ğ1qS3S%Y<.spd$; N0\L:B' xyy/UvY Ț49SK$Avo\ ʈVEe)@9ZW ;{B (l=0#a MhVup91޺Mu*n RzUY`31.]mfG@ Ib* Rwd_f5*%pd$cYdPM+kLA%aM\4k,< dSDXB(mH.`FN3ajcӪǠjB- V5FRr9P޲s\(38/W(A-Yj!@E:uz8JQIur4f@SbsyP8ꆈ$jm%K.5JH8ʡZ*}˳b!d񪬛vT:Z lmrE{굫nf35釟huY. fm퍚t aȽBViPMJi b"yݬOʽ$KKl?t`!ǙJ4.* mury&inn+ (dt1a#+M16]VjZHt^v5F_83d7bԐwF͒"#ww~*i4TQEU"I" ;Qce19.DlkW?qx}sX{Am?W'GSEMA~C.O~3;m[b0; !φxxaO4Ӆxvv.7DgŘE38dc+y1ZቤZX`Dd 25&Al^V I֐HGP[AÀ P6uUl=@l0OEQM@x)?ehHJ#1h܉8UUSj_Ab+qyJXFT[y[oO] iQcMRE{[ʹRs%6I 6[b6^.+jla^|͊BEFu Fhuۢp(I64dU*[@X.ew1f[!l#.Qyʼn!bZtn0ƎCbb`m|mj#a$B888d&7f2MK"V'6zq Z-K”qEʸ[v O{l~'.{Y "۩N+KB@LL$16T$fyZ e DEUu۾)W|L[ 2;kJԠ3)y+ 0+v1[lĢ86bED>y:P*HvOi\*[RI}5( O{U-,DqG '"Q 4z\6ݺzG77F5F) =qe ҶXBQ=.UB}S>KWpt 8$U6$[um{3|&FwaNB m^zFG>CHm B5'&Tщ@ݯ z'A+qp7Bz%᪅8(" v<:EHUhƊ9ulbt.dUuvSgs( [%i@:P5T*t'u9c:+ ڜ{}eV3y<2  9շs1zZLVwג,_M.؁ƚSqt'm<8nt6\uMo89@ƘSRM|v(E\W*2tVl'M/vLc񮈪疇Zfs46[}zjRNՙaF΁+^`[Yxn(@zLD9kQdS6FVg8fOAp(#!oyюBSyws-lmFÛMXec J(4!)#9)]{W.ͱ98Vvp1ʞPhVgt #U24jtJ"AҘ"uݮHaMQC'fdUSVdp 12.MkZѭWJFJn1%eԗ*(aE Q^P$d 1̕}&5B"0ƁdT!e 2kZ06twۼ4-.#ȵVpl B& S4h¤p"zbmDu*hXhx9u I1S]肀2vRtDǁ^ıZQUiFVvh,EzC;IL(26SYİj $b$hCb)'ٍ<6'O~0ȒN~DžyoVۗ9 9#8ɬLL9 [)&8ԯjҿ-S''{(KFm%yE9g[$rijGYGtU Z0 ; a`bj 6IWVEV+B.j;a۬2woKҌ\!2D_(I]n& p # |eCZKY8rC#/6ec3 Z/Hq{B>=zOw lɇuGpdCv5ƝYu ,)5٢hx12#U_?6f rgQ"`I) t  F 4,&C&A-MKթ[rRLb$07%pKuU 6*R0H1Kh@B" MXA&`R [\Je6;nuN2TsSJ  ,NlZ}^x.ô`@µ̵5v ]|vOsj?t-yҩGYgIgHd/;CIIX#bH *E loE\CeN"NLA)K Mþ%>68ҩ]hEEҠZc Eu]Zf&q$. BII P3aI@}bTX-7uvjJlL_CΔf Gs32>cSPZ"İA^1\\/xVZcskݔG9_PqӉ8]ncB^%yv&ps{wxnX笯o]{`#~ ]ˇAFfM|}B,NjC3}}ˏ;O/ZN^ om i~-[8s~zOb|HW pL(j-zf$Ђ9O#]ğ=zw>`n+Tijzu 跦lO+ *;߯iWU>So~Xw[]꟧T#y2V23 x٧h\ooW#̗/嫺?ǼAy eUB/666'ٲvb|c+k침KUUP̡TU:M6Dj'[4lC !XGvP։'@4y< ޔ/ހC EOv>OT^߁$x.Jm_ &:8>wS*) HsgΨSƐQGGaɉdeX |4x{6hE0 &CmuEO(gIOB;)ٱ4 4D$ܢl{~5 'J' P " N#lBOzQEQ vz&L " ~e4|!aO?va|4bv*hcD忍f{8>0 ~0D<((r4͊P{%,=* '%:/&য়ΫE>%#P HdQT)A*c.+@4l$*  Z طhkh[ p-+Y6KB_߂`AJ_!ED/B:eFEv!aŕc5̌*R,·0GrZ.T66=7UGͣ~פETb ,YAkI**P1en 68 c6--P+6 kU¥4]l|Fi1r$60QȰPH$*ZM e0k&6k!2a"}{ idoX{LNTRSOA\ta9IM ׬5G4LC1bQr%bxiݳ6e(t06 Yoapհ.:R!lx#~D)tD@m-s8+J-?ن 3Ikq,˂B AB14 TE\8E9]dZ +kQ|#d% h,?jgP Os39+N 1'}Ÿ??t&M1F͌cI`^W8Vm퐿Ct])=7gy/`23qSJQ&^e'j"&>8d C V}϶C_8F˻pͧ4F5LI0=U2*eT _mS/B&$:EGjO![M9S$(ƴPmvER}IMfS[H|ω:껑Z$-XUEɠi)B,KZßKe'Iѱ!8$61hr5&A ?DzI?2DIVXza(#Cn槮v_7y(2Q gr[gXc9J+ _̷>f0KE- Ւ!0~b ?ҌL>,S~?QMu1E$@kA&@f0"$ 1RM\ֆf& &'ed O,˪@T6tar´Xՠ`>-Xei8sGrb|,NXT!4>o&x݇%^$]XU=sEu Br:lE”aPxɘ[J$K$Ik{Gv=,x~~"-AuZdP^UMb)Qzs#Uůsa$[ąvQ0*S*~Ldf_}z&7 ۲v|p,K[A%Dž\[%?gMY{htd<4DO-_wm'K&_qbΊNOkĠz0=?G[Ԑ<|#7Z-tjPeo7٪%#7= sq؈% K&D؈4"%ObPW6'Jp&OB"X&O͇Κ|ϗ}OzWW˫)"9D~=ӑ-MGhzOFΩ}9z-uQ^[IWP~oN׌okC5z?QVDzomHrW_?~?1]{o'{&n~]DO^}}=I=ITan nFoIZ~ţu%߉Bk߮|;wO'f'Px)Cu~ځ;|}{϶>Vq faQe|Y?_|/&A_gYÕ?JH9R&x.R箲]!ww-+e"imi4%?8܈ ˧] ЙW>_m, N {O {jȾIJX7xL:DZhi Aur7H771Zzkco+i]p̯+d[DzZα2Ý#d&[mJ m"nmMCl))Zq@4LlllZb`" 6Ņ:.bi"UXoF1+kVX U6M1guV iXc'2c$Ybvq++ UHDDd1@{Eo4<ӧ'XikRb4KE$!F$@  ukO+)>jv].Y>k|eb*ŠRPRDSwP^WĖ, 0O/QXB$HN(4aUH) ""~ʼn!5b\i([>x:7pr O͖Od]@ΓbPuu.Hb_ݦWi˳\dmKÛWIR,` * (#H x(!@MvÒqETA`JSInbнaC2Y_#Π9E# )C^hH-Wsp<(IVm01}?AIom?!VfQADbX cEdbE>A5L`pU ɜpw<b:F!?(H(hhb+M16gFr zw`G;٧KMOا&dAu\oj B9 |xEbIaۭȩuc fGr gw\(.<])%?_(H ( ||CvVKdFvܜJ5=@ ퟄOV5L*b#RjLY&ym(Xo/K&KE"*PU &qεޔT6.6a1jjธ u>iVм0cf%$k%,d.rFe2rŗQfL68 gPS'[kSIj Ȑ4NCC`l!Up 1b0cggqXDAa8f$CdDeW.\acՔ`"cV X 2c"$3jW괗gPS8A A@B,Qd5ACi4kU&,ʤ h=sbJ$5Fr\ eaD0 RA11 )EgX` ~]c{> c ^8vSk|o-qtm⢪Q?EF ,D?~_⚥j(eW|$C998%Si00<᳸gyUkcCoA=E,HSʰj1`F,Od9"((>߿ܩ1G)KstlsMJRz6ꓮQ}wRLfʨ\VOQCBqP <(1C+3w2 jIm9jdGӬ%$ D! fK%Qe}_?b'6`1oR<#[XiѶn !ǂ& 0lDTEDXY>?CpD1[`hm $ :?ڔBڈ8]5 B , R]EѶ6X*Lc`=O٪nc~Dvh1-:Ql8-X6rĂB]mbE>'DP:tV'ϷŜ L8urRrCCLMF_o.Ú!4! TjU x-Stbf7on#E"1jգw\.[hn3ݼ%)JK,1 S m@Jq8& n6vIͫ5SVuInsBgn<'Tog4A:9^T|Om:w9)0}R<ș6E6М)JsOzI)V$`+,sF,S9M.)J mqU]jh`Cl6iefei&9bGUwmkPhmVӬe/Ɍf1U1Vb5*5_I SE!l4QU B  beՒG%p`@z ȧV("D6 $p[b!9IڌgLz'󟰞|3!ER㗚~ Ì&DKXOZD#<ԨPфJSR" !O~hiRLMҬјvml[*KQap?=\µ? Sf.5m=faV*5hTݞKO<6ՈbKUj)MT@u8<<~ԫ%9XX+pbyB)1y n9Vy'iH:5:(wN /Ztb=\:zٻ"E2'u+`+8D A(BfzJڞ27QƟe޺YQaaP"T v |BDD#dQC'-l*f$2v'W kpkj:y٥;55V Rp@R5ʱtႧ;ܴ)wҍ)s;}2Z] eDr`9V+x [.yJ<{ƈY2㗒v X텂*zKN&: n@%R:[6ާD1L V1% sVQ ЊSbYVj,h\q3kկ$4 U <8MɕQڕ}0̅9к=<%+&¶ڑelӷ!Jj/7`ܾ:]2 #j&ttTn݌svˬ[\f`czUС3r38ҩvM4m+42*XXT(Zt3]:uqڊ`@+&/RyŤfm3TS"Pڜ$9y|eMG&6q>%004hJr!B s]xEx@U|w\LYZSNn*t@b6,ګ7fn  >SG@MmNR.lLȰq6C! ܶ+X 惆l[yN󾸹&Y$[*1U 2c&I%4"sm42܋$:ie*.дcT.Fd,ry4chqِ7Bq¸FH5&*gpG;ۓ|5vpC 2ڽX7+G Ul&0wИG(@Ď'hkG7OgoeǨ(T0Kjr{ ӽ[m (^5vFݰtmq"0諭ǔWHូkC],vXLh&5XήhNUV Ǭ^^ddPq% ,Wscj^ePV6͍(Ϋx锶sE  FA6blc|&5Ե [KOp cN"i(H߱O(F1D(ϗK"`-&g[B2e2hgh5i<;-໧CRR`C C"u\'v^34)J5`*Cge tl@!Bbt`\ D 7i!D4nh4"*,ф)SN  l dP)J$gsLHZ4,_D#rوg"4Cf3d3(Ul߸sU=Uڸpi L%qfL2TPSm1h<.YȱF@E7?gQ=I9?v)}HR)Nt)~}˳{UC3?eK0H(,ήHZKi_@֒;IPLR׀B ,dy>]!=O*b,QA`Cτ>\..Q?|kQ02kE_DXBR*6B%E6ʑfZeŖi j-2+yGteUR$h$p]eY U{]6C~_}O?TմP+ @tPR\V666dq5JCT=&wdYP8ʈ#Rd?e)dOh$むA6!BlI(D` aC B`!6(X2 \,^(MI9%Y!qzT(>V '.\іˢAK- )6/27Xːp!6e!bj 4h0dA[H" ƵVZդ”Œ d@ȅNv樒m,I&_7(*!"RD-VtIDJgŖ~TdE{DJ@ÆYS-t!ꊌ/͟4E\U(MY}.9FUUKق!PٿJE1 y]}51>XáE1$|(k_r?qsU1{5YL~[G𨑂BqM&]!AOs!ߥZ(pAƘMH_Iv5BzU?! }0`qr vPCG?6heu}~OO\YЉE!p`Ch" 6 ·7ŶClS/d,DTlKZ6X(bP`RL{%T?)J$(EkI%)KZUU85ƞ9s i;fpZWX<ͨ/W|wp'Q1]#$l3cpmEa/;5-a$܌}5n-[`i l th@ AL#4h4t&06!b:}؉;,,]I/qNoYx 1>3M2$hҚm/oO=>m;ηi?xK 5ll*U4= ;ckr"Ϥ*Gfg &mim;/0|f2){rl<W۷gq0Aodj2S `$ )!AA9XWz98jmbu k.RyY|0fĶ] wYYS;-,+50jě'vI&ωnF-(9ZZLWJQ&tM@RB&YP[;͊H-WF,boG!`~_CzgvDE~3 ]( P@ b?RF1{V H@ m]Æ @C@\%`ja2cu%eL~Zq\ tR,EYERdVM%a j{SUAdFj1m( C*(f.Z FqDXP` ;@X"(Y*(D,1XeBA D@DD>;CBO?}/sjNKݴA%o֛;xKccf,JOQJE۠eۣb.6s0*š`Z3BBpXW [˘/m ,5+<&+%2BA n$̹) F %+d@gJ,aʐPRJĭb*Uhcq+XYVBD"e@*T% I %E"J$ /tv~xzcPoi I*bLW3U(ꩡ'+dyȅ tޅ@SVZ9!] za~mpŖQCщhd61VE3gQra&Yr#awUAE u.d* lPu{ fk6mkm41 RB[bcBlChijm® LH%NE=OSű FEXڑRƝLh*TBB$PFdX(1Ԙ(k4R@ HnC (A|j mn>K!oF5D U`-f>=ZUX)CBtlܶxK g*QL (V,Y1p.6i gnl) HEe)$D&0ÄHY E-փ8dMsƀd *"UJm B LXAHC&&@BcP Us.[j@Db!H B@`XJFݙ. \p0C_QmbDy28|lδ #XW%\*1j*?4$d1K=|s W"HDq3i o4@5]ّ*bǐn~Ǘ;RNCR4C,A nYWiPҒ]eU$$A79H9QQYj9>~+**//U@bq㩪 kBo/5 |pae/~^ͱbJ/i@-Xqy ~~]|\yč\"}!ļ MRץ  iWE]\G3e5^I.KQj>l(W 4[+ '*׵0X0(f(@PG:`ACDxezp{~x> Nsd=TMeQ(97'o@n護HvfvP˚#Ș>aߚ]kw :QhUHtͼjIZ@Sl1-@Yg2fD/-Xv&S w2Ikj2N@ \`d"` `;dTl5V;)Ib\ZWH#.l[;l@1I 7yt O]e_,3TȠ 7;.sRU@4Lp{㈝hS"ҀqdbcX/@܊g]NN & uD j;hHQ}s!>ϑ $(~Mbɲ~MK5- ٰL%aɃ&G Y>E6†AcP\1J1ThPYGedŽ-PԘxf:1u%L92nupnUщ`Z@ l=h< J0/| # :uhg<F@6$ 5kU޹T Q "ZaH@*N'Qm!w bk/H9gX6FȫAhQbTXʸn"'{1&)a4 z@9sE92 ? "^ZHR٣oRq (0v65@"ʢ"{qø!"k0@jkf)ʈ=ZAXf ];6,9Mt 'Dho!QPIuERk$l.(zz ^7XStB NXkj<,%>DrZYEqRTvҺ#w=mao?!tcAi8wRSU+JetLU8kSt)F ($Z%}?|nlNfYb"H! "Iutv(}K_Ϭʟ?kȐXRES)) 3r@wc35am^SjZ[ޱ󛸮Fw]ІkǩSAyJp=GqC(ĘAq: ##.+LFPS$p~,NU$a5ّa"n隲s[: fh Kb3@ɹ W3 yL$" ̐ 1YK`ި^-hȃek)ht>p+DП%*~oէ_6}^_˷M8m\+\;mֵ4*mU+UMjmXX"0HH ib5 0Plsg ,4(%C`3i,!afSNMQ-"0AE۞X}dug)ip%/2+V5^eQV'wV+JE,2 囟0i/@>Φ~ i^eɀlkX\y5<$jk\Ҥ, Y7JRÂ'.3<1)rٖe4OMLyehnMÝC圩31r>y-?C/k|ҺxD|`i-;~K'' ,Bl~.;ЫŽTUCյr)eum&uַ7!"(E팔3ULMSkw2ak,_KQ`p5[?7sen'[l<-O* `Εs"VjnFiWJ6dLyʞ"$yq!eDY1J d*0AͰcE`t'&)СizdcݫqJEz{QԈ4_WJqvb5ĆLgWYV?^>m Da+"Xc!7QjV䁃b@!QDNgلpӅAN=Q>F{NDtmRiOZɲ͞[aeD&mungZjSY^xo?{?×{j E?~?14&6rb=BeL\Aq&c'։?ɐ]*M M6)Cb׌(Vc(NZ=ލfc2hĉ?7?~/-ѡ1Rcd8ީYv(͗Zj*ﵦF$*d7%l\-ͶoqK]j\/xZ/6+_%ݘHEL5k认!ƌ,fkV'iN pNpdNȑ~st~~p=3NO~ ~^Wl xO&),-Irc}~r)qrA ƩbJJJK9vn͵R BcuΉ/HtUs(E@٪k*1`KlR*,d  Jcp,+4,SJM9 =SNP |Oul=5&i9966ȟYȧg܋5L"ay_+|5H=7vu@m8 <5ĸ (lI- ]p,U֛LO%UdD~>pi¿b蟴JPrRq)$eD ߡRB\ HS5IL([v/gv" c ge.%zF]G\F__]]TX89/m(OxBHiՂ: JQ&^'`spy19_5a6Ncf j- ,HʪBG mIևx2m MlP+׌:ϊ*yF@y>QE" k'~_Ȣ 2d͍ 0jA FaZ24hm4uWgbCpm3pr%#mf\!B[+Gpo%L#c^6^Xin"&@Ҁr-ug}z SMqz̃^kc Q\mYVU$ `]TpЮ XHN:5uo,XEqPAA!Ng`U,Vh<9?`#a y8ulfYAbi6#RmE$c[mlD?~~1T@`,_4-J´+_8dG_M}&o][v5ΒkmXq0ct- !eT!tVʕ:vx/'+dUNʪyj*k,%NV02GsnF+Lh&yL \4eIŹ]aBO)̹09lFNѶ8;>$V7;OlAC@WOܑd082iZ>X`:aܼ{JH$vBTM6 wXFH H)e\<葲Sw;n <[Ԩtċ8#x=+zJY%M9f T% x$p֬]ʺDDP EG-3U.9# ZI#)BaBιd<ըlD>Ų-[]BwZȚSu!kb05ҁrtNjaTR%˗ R @!"b;\Q Xr31&N[4$#m.@WHTȐ& tpա-2ۚ \ I.YMhmunfcl  c*"ZT/GHƄJ zZzdS$9b A"&d6P "]&Ĩ3  91-ɣ5t'"m2MԘ$hINҡjBi.;D\Pv.E b2oy&~Q|agP1>6O-H~ ;fUV 3m++?S?YVTLod.F jK3/>/ޘhykvyɆF%1e\mYDiy'y}Kq4lli6mLWԅҩ#3SxLK;Ϝ$JD1[ynH} bX\!>(@P'֩T4Vղ4hwҭFY5(ɞ͙'?UUPKN[TիƮZVR֌?9:OaA 4i614 .dAq[ݱcCchξúA\Qvr"I`E kٽ[X+H8-QWf}]VORo7JG; a `=˷ hsr|8TSģK `vv`><뿯dsnI&ޅtWK @lm 4J2(~P(6(%v*ŅqlnP,X}h[;muݿli'*w3I̧*)(J'))8oS̳o EFӺ*XA*d,]'(ef,9WRjkN pYG%RóCq@beõs9` eNje)r)SxUِ䀂i]N۶ن>bG%oU%㱳nl#K7 s鋹7tA@5Cjk儕(eLfT1]WkjQ6\+f]']S ݚ50M]nlϥSoK/bS܅6j-G/-&nސfdƐ5zTbs @b[95p36D Y,');5QzȲpC}tm,@d-XLjDJz5dn^JkrL㝣԰`ꪫRJb"_MiLΪXnV'.u3/"v\[uExAv\k,J&t:xX! kp(𙩅1!xĪ%X͉j]T TN&dMz4:L'*sL{1"񋳳qy2ɚTX˗\L wQZbqwcAd @Mк/iE0*UjZsut QW-7WY/tٝCdI]o1 2H4Bdk$]Jʫ;y*vpuwIۢN'gn,zrXӢ[URg6ŕQdvۣޣi@̜$.32LG3q$;ɳ5$Cm͖Mp>\`HDJ~y],Bor<e NHRDMsWIPն`wHIBƳc[ zP1=ϫiu(uX޸ 93fhfS!#VYgW4c3X[inVBH ϕ9&4 :X*)Kְ\a"~3s.6"B +Ċ׷$e7k.Sou /XR-X7e6.]8GHg0br\*ۺóFzJW0Xny0(ڗJMs əUMْHG\%d:3,0ή&c9i̢$Q 8-Xa*ZМ,!$8/Ŋ R$V r MdV ($ (jjvxЛ$4jf·TxtKh@ -e`ʹbCWC+y+#,i{Ib DXX˶$8s- TQ/T2%L-0#:d1&o%68vqAFQ(qD aZM aXoP  6SwUH (YogDueYob-Nܬͮ,2vGZubf8P9ꝽFICz%i!`INm𩵓6wwg%7g A7!ȥcMI ׈^ܹLKg S5*7_ aPbǏ(CMC$CڤLIyGehTX)4*!b )aPfViPXM(H$lH@Y[`Xw+ /L:g!e}74:vMRaN0QvR Olq3i44 j]}M_EjlhV&W'@҈>B*H}Dn(`b,)@] ;LCz44t`}{Y@xz`d=sh )D(ZpW4`w`t@P ou*h 1WI( *ۻvW U[{;,=ΝDigZwmgvwVf_@i(@ pocTR Nf EEzn᜶A`uE4 kva޹]ī[{SAکlbt4wك$O}}{ܕY=cXVLR,$ٻimU;usnx= )@֬A{lo]wz1 ҏ<@F@P(9(.oNb;a ]=%v@BZ֍=PֺC"*lYmZMX ͯʪ1G5lh Bٚn:jIm{t4hPQݰ֠Dӣנ zI@ӣG@ʒ<^I ]٣@[VjklݺtDvNaյEljdUO}ۛ7VhvVMvm;8UغÕfe mZw4+=th,F؅}A@uw F3r݊NC}=[TE8@k la>54+eeANMrT*;;hMgZ9W2ԊJhldȷv`ozシ5"v+Ui֊fS86>殛3jӵi]2 }Tٛi6Z}}۠}Іw6x V+6 X-l 6(@4`A;{$Vx|,x@y̯Q6`bW}jȡm>(D 4螚#0OS&# 020L 5c~oTl.?ހK0_*~n&ΆeMC>3nf%.\0,}N(@aU &1ĢTLp-Z0\8ZSYYS5Lpf.r\hӭL\E5kiBKlE 2Mj+3۔U&TܕVp&2$J.&"89iKJSn.Qs3 9fc1m 0bզWf6')AuqkɊնv@Y dߜtf6 k9,5QQ($h!O,DYIZ,0h[-+Fㅷ.eY1f%кZRhf:] N&U-rE\ -S, 2C-aWqRsKwALh*f&VYqrqKr̷)Urfir֫4殳 3HۖnZ5#p\g̑HL@MJf.\nfg0n*̥msf5Fb=\UAa]Yqi/Sz2pK,U֬1IZc-2%q-nPSyEw-̣a8Bi$X1&ho[L6Ab Y!A9\2Vb&C&X:*Gr?XhUb\.cq̬LLFfq " eeFZ}%@@Ũ"$SQ5}{wt hdzbH ǫȄTZUQI%EPU(h@(F @Q_Cu_ٶ߸wC_?>]>@㛻 3w;/],(Wz"ǽqپOyfo XVZ 0艦D0~~\߻ݔhWQ_ܽT#5QLכ]7]/U鞟ZЋֺ0`COxr©] ³#kHf"܄֦^]-VZwy~~ȃ~~H>:%k>t1ouy矶鿃cA$s+TC!ad] 0G'ƏzeLX 2BFD?s9~!? ??/ߟoc, OU R?\)I0-eWZrūA=Bޭ߲>>~irB@RP RҵB"-% U E(PОSB*/ zW"P`@SO ?Em u1(IDf%!+ BҨJ+E3Hm@JeHL3&DgFD?֩!TӑB֢ 52LKIkJRK "DȐS2O]z'Kܺ|uqNcLu룯HaTsI]޵{4R7!^=nZѕo8px{Z2 *GElFVlUWM4%gntC['ﱫTբUetU ^ѻsQS0fh zIaΡMT@p] }1ɕېUCD `w'X8ΥWDSpk ֒bG ΃> K}m#YXطϼOhE^C]4eGQ͖B\Z\EŬclA[Szѿ{:csPDXEiXBQbۧH2:{T5l QV.́{L۱s%HR_ra\`WP 7UTt_4f*Ѻ*%MC.+(g-ڛ=DzfR*ZNӕ (As݋eJ^UUFfcSQm%EiF4Ƙ@L '2֦[yGNfX|7m`V 7zfC:&!SR KG[w`d ܴ[$u5Cfl!̑0$Z H2H ՠ`-Z "H $u-,։ܡ +h9#% -U"")A)YrM@ 0L'! JEP2%hEQga4^Y8M,oB D`aTIR%+w-x\y3.tԩ8~P02{8\#^#x(Ӵ:5!yZ8moAb9uJUr)D{j$ܬ93[^(ӣ5Tnl 0n4DZ+Ex 4<%0Gt{se6o p8>V^yܱGTjwp xyق C [(cRȖ{ɆxZwї}k{o(\{=WtsYV;43  w%Xd/fݫ n@@IlC: 4l*տyF=k|I9l'k8Jov]J~wR+rU+Ri~}p Q)V ƘQe蛖U]en٪xC0]<pݺ :t )Q7Rs#fE@#Z!fEupg^W;80h{ Yqzn[Nޓ;eUͭV^$ xY .xso\=!9+:57Ѷnݢ 4Sr[HJIjhd` $^'NiGMϺ0SNI}~xA [H\QȧB/k_Bji{- ք#LhXs\nMTێԅr UZp&-:uI@CL?W/y=g*鸐WfpU߉]Bߖ 1)(`bR&݌F* :u,G¥&Ǘ !aQe30.d \(EZ˔`Ey`쏟&(/x`kx$(PWSl R^{C ͋C7J%a F^@+V7wa,XHY Om!LS)ctLMګ;t3S[@!1{ "nI@A$~ F1"@}P6shuP"DQER5aafccdYL`Ef9Jl[n0d&m6su}%|U("hjVzJ4N/u7et[hԞXcNuA/!wqͭ Cq\Z +E ^엌 웷sO$'o|r]'5̼c.Ҷ0w-*TTAϠDf ιzLlbAz}@Z(.邷T׉Ο[E#cЖu1C%y0k&,K(Ҕ0Vvg-5Ybfg*ՃRQfu+3u۹ wwmn&r9zvŎ]4Fʾ1nK2N"UlHM$|IlGDgnN7^v'8eN&V 3{_X.hmlT퉐3R׺kiBo[M$d+Vhv!B%x:Z%͙᷌٤0xdURٱJ˄P<_)fVN!:F_|+L.z@ĝZ} h.ɐf_"2=z-X; [N~mV"%he9X'4VEǪ,s@ST{ t.o(PӻpM+`z1Хt>;/3*@B^xk)a Vie_ou;::C'Fu<|m3G!a2Z;A`km.ճp3%1¼B]X)takVuy,E"  F(YݪJv1,a 9Yb xueoW8y'UsGN+vG*<%^er{7PVlwgvMfxx< !i64Q2s >^}~o^HHNܦkR@f1= h/aFL3}N: 9J |mE JP8|fM_(l,ueRtu^ޙ5~뜫nWIco-}CQ+3uAw1!1T7ғVKh:"ppTX#6gCKh6D$ui yCV yhEcѧ3G jƣMzT;XXkZ.v˘ݝ V [BbUt HRYda#u[{HNuz~Pu1ZvUYyMaov Ap3}khh!̷{bS2BצNM/ Y)8`tkMXmdh{w642+ CVحQ\Te[6 chbj(˸V LSoL f&#2rUTR H\j `^;! aťBE;Uob=-)ƞ.^D|;">F[{F ͸6fH@eP5r_b\h { xH}2 ۉ hfuRPJ̒!^=3Am8{I7WMS@T/`GΜ7VӷӻEna97u Di9ۗyה)E86]ͱS ec2i~@]/r؁ҀOEsV}Jj iV)])hwy.!B)mxB.Yƴ" "UJ:ӎT{u&\3$&cO[ (8 O8X^ʬ6!W4$ٶo+؄$zܮ[kg)r]|.s4N vu m#0EV@򳷸 ss+PTG]|Lwn,|r'sQT-^F ~`Q[*޾+N;^+59 aB)KKw7qN7h{ްTV)Woqs횩'5\y7:+0yΞtU `fqF㗴*4!$$8[Z[l4)r*vaau;(Y_euJuTIif^ά w^ф!`\X*ٳ_ u DW^m 5zT#ʪ{oWf\gٕbFGDq6whרV X^8% >6Pܛ+'*ڡܥw\Y^D: DEMީ=u+y#^i6VuvlnT4e:ʬ֔LvdnWnQ3|iw/*An1(ރݓE XzAA mgt9YnMs+V/0Y\ <$_u4bs6jvHn%7=wMF5%]*Ork`>5%P{$<8=rޒ RXvBC]Q D!DNv9>bOu!3"yLDk{PLc&xN7F۲厢1RZ;*S].GħaqG˪#Ěԯω8Oi.f$0V ,bj :j*jD˴f[bqpj)nׅ5"wBU@a;N w_VP^;Wgh61$LJ5B2D zWl=jVr`׌'quv\@[~ mR~ [R-Wz9d3(k 4+FNٖ ] Ւ˻j :+k-js.hi3U{yțRWQ~UqR"9{a!7; {|3y7N-XH/0Juܛ:92tolvMjV+lmćMzvH`-BiV֙a22gy N`;oD.ѺG2_r8̩J(75(aaA.@Py Ws mѵU :E7RɁDn)Em"^x4'Ⱦ|Tj1m\It1 ;tBPHޞ$vefi|ۗyt"s|H3ŏzQuQV1^GvS`U$'J"}X@]/e\Rd*\&::ͷn{/eYڧs!raU0&u: ww6d,ãzD!pIFVt7ugFȿTJwU4BWjdAsZI(̾ŚRULH ҳüH9pa=Ӷ(g y`Pm ^`B,<^ÈwzA%.,JT^~m, Ѧ2;r ydqj4u S+CU᫝oՙDJ?`CnTj %4cͻLΩ.Qˬ>z0fU/N)1xi8՞SW%\M3x>}U8;:WsmwVr*UrѢn0+y[,h^f`od5W> l"z_xWS-oY fRSO^ פr6XX.^JmF]zy*z1IH`Y7ƚܕ:ȫ<.  2F9ʤ4%@ N=L;v 'ö{`@˃ Y=:褵z;O:]SPQ34^uV\åjȀ<:N5P ;LJ(:YҕֵYP22v§Yu`Y40nlXib؆MpɃO۱S?rA`0(ףڻv^Pj3ƻq Z_t6U۱Gz{K&W Kt0+@Dyx tpR >Hs 7+3A ePCS>iG2!Cv!U BT3pVrj4|:4WbɖCsDe{eX PO`1cjN612:_RyCyF@~ A8Yd|/twyuob])oygt)w4Ue;83c<%3"w՛(q #+RW}b)uM(UWV5m7Y\1rKwڱfks]͚]gu !.֋hb[S'W 5x]pO6 f+'B 1 fM#SX 0'9Ӧ l DF"F@"'~+:}^&E0 &$s5)CZ×/G]b-zٱg/(VU 'բ*wزwm^V:\EMXRSl;W~ރvo C΅vtzıb']deB8\n\ O]E*X:Loc47{oT0`Ua1Q:,١ddӆazUZ&Ѭ S sk|ݛ dvmm;xӪaۭ'nf"3'{7}Mx[ujZڎ-.` آϺ //oh^1>Vݭ`"{YnYwb޹/M'Kl -zERâWtȧ˸꾫;8.(;ٌofPe*7R", y cB ! #Ezo$SH= a )&@EMyl +l8;[Y.ejIͱĿy>GJ4Ӈ,}Xsk2ma, FcDJVP̯6,8]i*vL Pށ^bKs[+uXp>wDDn-y YpzeD,+E+qfwfWWݕSݠD=+ޣNL\&i^ຮC[8& !5yQϣG4,ovkWMD2_QxL˼Hgovԭ˵.썺5ftkwKnzݸJXSԈε.<E8CUyȈ8۰.5{Gr`9Xo6׌kNf}좯>㏇g&̿!~6wи)UN.вpfd7F]7acC*d;U*r}qUhߍBHP})]@g?]>|-u+7]J"\@=`۰AU:E̬`zqC8v $x0vv<ӻmwX pQ̫b Cazp7 A#p U8JZhVz{#6"q \|!;e 2^]W=x;nVkGw!EhKs ayy^ F)2 & NKwH*> X {;}f4"lڄ[{\F1u1%tumLqգ+5X)kA=v'@HMd-}^Ҝ)1]pa2GV5 ބۮ=VZGQ{}=3lXSWcFxahއե*Lc}f\Mn䫮"jx&j[ Ze7Uu6wUpSA ؐlJ= $E*8QfVV 6s{ҒOk87{tJG$tw~O$N4*@(uaN&!P)5RB)pѨYModg ;Vvaj 3!Q*eW mJ ƥoSbR p!B RD$0 a)EE)9R#rӾxw2A|:?<Xzo, Qup^\µ9zY|<ɚ׷ha+Ѹy_/,WBEan3dP2 WuR CHt'Ρw*l6uS( 8 EZ4Wn+꛴`uIrWv:lucjyx",YH$i䦁SMX6ņM2qSi8=3VjMJVIQ'6`R*IXTazME+)%@B$ M ý!/jS9`9eT|

|4[V^"^r],;CbYʰ걝pp{ SQ 1!֠DmR[H  P@ >-ԝA4ѺoE0jdCߚE06}yVP\!]j=KR5Dg%{15rfnVk~i<̲Cs :K0 Z l129Twy`U)ʡ я v+^*1To9XaFnPڧYJg&Pwi]dɅ;ell YZvfX[D\ DcΖP̥;߅ "X<=Irȫp$(9)M 1͖]n/yg=z/0QcZ¯Xʼ/ֳZ熵hSDS Y,fNMYuG4mC[jenD̻laAPb)MDiLT71u/z O{a96iNPG hwDL^Wd$M˳x:0׺jVv*Z7b o4^f`"CL4WW,I4R..ǑU^4`r  v7+`LVRfhmk{}!݃w])Is tP7t&^جw{IyhmS6;? V>>"j-1|4%W0wog<.IC*o#MgYJ|v zӢ6ф<)Qv_ePGsN ^V$ADeηIѳ+Fq8ʙ|q<5՗9eaJ+2 .F֗%fng sX9Ѯ{XnSǎQDKK;/+08=79ӆqYL[#rݭcxs)Zc3Omg^ocMz쇘F84{+7޵KF6/ x]}@Ǵ4<_`~ve ,wG^ɿ;] n_Y(X0bE2MqΚ;]i\ f ͛~a0:XPkpJ a~:zfuAOA-.޸WO׎9jQ WKH|uJB;D/dM*5A4BTv$ uVIF][DZfuh%==Qw%sSNS l{szild v{wbەf6HVa> mC>D0+`vEs78w iuxٯ*YȽwT*_&D` U@s4 %Udy{ᾝSo"FPLʝleyY؅fxi\rx ;b) k^p3Lg^ ,b)V{PG3tV$ T+/ T<IKyQMh{-9$ferFom@OWU-g d}H,P)czUXè#iigs}=MTUXMJZn ;B:xg)Y@ooP9ͬP.vV]nu3 UgYeslL`e/{h.Vl͡r؏ͩ5V ^6=oxWYyUλGV(΋+ͮߣ9ɌtuR̨eOí`3;`4f\ }![,!乏R #-2T$`Լц:g^EzLVz@ePD5κGWse8e6u震Due :q[o4` >]Ŀ\&bv0,Akz)wrOfxClF16 * 1q$"%@4 sdkZQmׯlr <4{Ȥ;CIwa7i N`ieys$Ӆ+f \i0V]+NeRH7Dbr֜z<븽@htvfJW"niyY^9`m=ʛMu VxTC9+v]Y]`_^Nm݉H.@x A1, ӄyX<AW}HG*%T86|0IݝW xm R8{/JC;KL̽.dC2f8* .wuN[J^DN=٤i)gVw!Ҟ*=Mb5n^Q|<&Pb}`RJ:Tis<5ؓx{ndeEbךG5d'r{R.#v`YU1ɎQC unvH־]3mѾzo=%ƇIò2yŌ`Hmkݸpze`TPk! \͕R<ُ݃Fq h+ǟ.uxj<(P^5`=7Mk (_v,6}U=jC;ǀQhV5q>P/7;nbTΔB*eaָXԽ? NS7tۏXs=B Y(ˡLZF{g+6ZBrԹNp,nGhZ.=p7qƒ(*!MCj7ĮIUA Ĉ0ȼHjˎr̔Jd= 6V\a;AW4'8x~4f6cL됂a)]<6wvnn]!Cbw٥`߉ :֐{j[H6ElB;:u$y֠g>A=RFo28UTY5ئQ6s9qYu.̡cҷcսDpXED -;5Lmbe5zNQj1_y4t}ӫвynNpP;5*,QfeΧG = hA]%`T6ErH9v许=ځ gE}1oU ޛs|u}/q9e77kۢt:NwW]M .u7m7u,\z뒵*U Ӆ:ڻu7wEbtw4+^ +1C`9MGCh{siFLN/H4Xlp} gs7U\v{ b~};ġUe즟 r52Y31fp;1+mW6F4q[MTt+/w׻s= @(7ܶP@G-[wbs;8̭^|.;ECr~1Wpuk.Et\}zWՍfv o2bofn !@qtV >j`w ո7va6UQpl[Yr:cdFN.|-tﰑ~<(Gu:mv=tJwȈ=6{ID Bɛ\uR5v6,FaClLwCPs32{YXhP#C ֮-v A򑮦;՞7@c \`MP~i~}3h|U%Ui.{ $Jj7ȊbkE \a׻P# 2EmY*g-WK_UPV :`,e֙sUw]ۻ+ ;|m㡵WLTh݋Ŷ VcoBfiYs)R9Ry y0c%R7֫_+Aqm&Qo/v"DqPjҜ\ ~ [fpˮ>%%S>,5<06 x9KPhۈ7x Aײ7"xSG `РMR:,QG|2:LʣjFzau-ܭʔHCrwGǹMjjR7ٖequ $(h^2ڒBkTp鬪 רrFrbĂRHg$4l/vcغz^7;MfO.ޮ=ewR@̷ؽ d¨L}A{nX۝2->9Е!}oKo'n5xX; 31Q F4OgSFEK|;޺i΄ruN3@u=/yZXidp @r99q(Ni4gN y-u`q2=QϪmޭ^=La(}6գGvfpwm;4idUѓrK5(?+R| s0ab9Ck 3֢O =|*>M1J_򒝧y批Kp^x`- 2u:TUfmwGPh]ҙX E[l%$F5 RƊXO+yZQ-d ֵF{MX2tsMu( HQƦU LB ?|$]DdҊ`V娵e}tX,/dDYv:fv汗bQUvR~A* 3jCif}Ptg_%MMCz*GoIo5іA3-q)ڐ/*xMh2IUH kQjUm"ԜKɸDlv[lREDA hV%Ѝ387OY32C`bR *b%*f*q C;/f\ }9isXsLOL(clxȘH̟_a}D_HyX4`p>KSq"/23M I~(~1*P~k{AtD\dxZ3ؚw l>D ~f/qY# f-ʶ$PD9BmԪ`DJ^#k'P5>SSY//={`ׁGdJ=4wc0N}_o"5`|kZ?'"!UUMw1i6Vx6x#9 ̭"d_hd9)y]^y-(1q w $fc;̰~kߞ$p^Q4SpQSu* Ӱf,~+!ZC(s7buCOgLJ(D2X0p^;k.pR|"6n2vY(X4(IUFVQ)l?}wa]{}pSLq(5Ev1X榡~Luk[vbdlӬdg(FC!z)h(1ڧUh]BF3)hjӏ1]9Eˌ{eX,L)X 'd>dx.peXv0B*`dK$v -t@\N--R38Q̪ )g<1u,oi'&1CR C-k9/ Z^rVĥh: t*$3;`Zc?B}b>*4=>u}Y9̅U1kXK{Yׅq7< e=Nha:k)M,,UpwtR¦R9-@{Vq:HgZEpdR/]rޗJwۈ<ՂT*"VTf>5%>HEMdd-M0OVz: ɰcW͠cg -߾y] vP4,]ÍҚΌF;YwsON^v!(5 Ǘ+gX5StסOɎ2h9=g9i ik Yի2DZ3\0spؕj$\o^oWX0M0mS0EJDNthnzkv 3@$Dk0J)vc-XvZcU\";L ˭l5 D!@֮tV:y)#>--{ыVJ~ÄQ#V8N.- k)t [曷0>wkYVRu(j5՞6ϱMW?ӣhʦr97& DPۣD&S7!)Xԁ)ӧ_cDša)7z+꟠_2TI FtiCݶo8YU]N7{KoDL@#E!=~!Ͼ7^fIpyBS "WO/P"ZKYp.`_뼾n GŪ 3B ܬ(4xăphF ,*(*B7UNr5%4u'ۗ &k M D[jb%;zƧy!eGSrHᆲ=[8Z1/=wN{]0VĦ/r}'/snwS4gx'N8+\L҄3&Yq夢-{k^7V^#IBNWaljح]Uѽ myi1x/'պVfvK;٫9N\J Y:1 N3p_(};Mz#foJ|I O8;l\o1P"#wԏC߯>90Rwi9h^Ġp8ޑ%؝dN spCbz%=^KP:Wz:"'#A$H$*hb`J!(h $&(U.oG#Xy:g lcm F$$( (&ZJO<,jy}$1y?B<,<nj#757RV%*3VOeUهbfT/ +0uR W`ط縝)dϠ/.qg/[@8/ j(iXį A<y14D"u8^o{HO*|:y6LbfPqyrzVmF2'aMXbzjgNHK]ǿn \8(RԜZ@ZV9(RE նXe] `^/p0@o]\x[;-2%81yfky7Ja/]_)+X*%Wi{4w8r2ZBϨV?q.W{_1ot-T0ڌ66xm1ٍZώYFgsA8m%`wGraKϾ.}.[AR/G\Rj|c9mXSqnD-3竉On"o߱fl hAaM3Csc]R(tduZ͵}V}ܮI[e (džT[ZεgQ$hBb}n߃wS0!YzhNXƌπ{m6cs;wꁈ!J@HM፰k>/#Q^G $Ff :o%bQ*͕gjŸ Oz>_x۰&A9%2{Z˨pD^fMFeÐEnђfn29h= m#FY 1cBìiX*D<(D+#H=R)!F)4Er\dxtAQ_A宯eҗQ[chb:u,Jj}HuVt5R\Ko'{o@T)¤j7R{s=(փjΠeR##V4VgSUb8tI%MlKCšt^UN$6MԔ30Vo"q[9*Ӻ 2„m^ϼPDqZ$#w4嶋ڦs!r@ C`#f٪vMZh|uJ^ȏ;0۠j "YD@O.a{S=/g;jW4hNpw棯Y|I%[{|Nwع M1/Akϋ3^[P;,9u*rR%'^½F B~/UL ܼq->_ќ{o-,MAz>? 4NTIN _'=KT J[YӴ׉c*2`*hأCCJ6ִ%dюJ& RbL b[W_M:7u2zܚi+S3Cݒlzķzġ<$u{FDܒBLߘ8b?o?o}>p@}'~kܝWTF ܫ46SKŖg_2/<uQrxRj8ݯ_;@X>UH99;_;q;pG> ػdTL}pu{8ffϏK1 \!Z˞t @^M[N&`IsXfW^eb1pVۨk۳[=xzVקy>~ _Wj228R{fc[unًLy<rj Ժ`Sb5wa3"J7"$hSH"``xѴԜ s(Ɲ(P0IDKDMCY5jUT&.;d[&)Dw*RF^FhBZ}؆"E+~f B!>:q-:Έ_5x  B g".98lDq[-HǶK%. Ck~ YmvP+˸r;ibgIr^qDqGy!S73}W]@g#"EXxrh_?<OrQdm̃X8;.fffE qa!dCRg7a|z=c7;u?y-P0'~SO=\L98%~baL*$dFW2]Xt5X!^XO!VYDN ɌP.Xܹah+c)ZS0:JyÍQGѠGoBXID^|B}vRԖ \\HBMCuF@\g4 SIo]ھƄ nYbu(kʫ۾*4TAͫ}Ww[JjjZR+-'{X%㢲r:ag Nށ,GiiΊ"G_kS|J\!pNXCzd=<Jg\QngH5h8CDEMAERLqQ9pI"P%Y 󹭑ӞW8LlM0m + qp DC4 EA׍&u:@ {_HhtS/OyEK/|ь &faaUZթRe.*רm3Ե>j*DУkq& ]e*bg9q$/1̾;`A||KlM0lpͳ57xhш PcXt[x Զ|-%Ii AH2NݟZy!`6peyxNҰCkvj|3B7@OrFnд:/m2AVЗz Z(Ӎg*2G8*2[!i4c%vX8 'x'Lbrӈ6c\=OZjs(,FW1>= JXއA;uHi!,KMsw+A0|+]u9^pO"B C!5BG0s(?_'͆nmKj;Mױb f6 ljFuj6 A77ŝ8Jw]k|]}" sHrヂ 'WG!у=N7]] = cn] g0ϣ7Szy>RM =_y_,Ҽߝ]WόJ2cTL$@Y\I;8dUɫhve0$T\&i;V7D^xuVڬ&IGFgg܈Ai.*uTVw/3f!ʋ1(PJ;lBȱ!`8`5~v ;azs}p߸*)O`r M$\kAA"O=[LM"e}}G6<j 5s\riq+PM@цo6wu|!(x2WbKpco\gw ` l` $W{y(,46"RH5- e~pkBQa*#j,Ȥr)gg6W&X^9g |vt mz/;>Sb jh{ {xR̀8}T }$÷oX?/~iP=맾6,d7Mb{dU  4J=PIܵXhmdjfu  #l yUhfzV$xbZ[B-4K*^fVJ04UN(=Kɹ6kyfKҶ,lmfK:9Nb23_c~y&mks|1 ,˫򥞔-k2=5o5@-x | -?}`'L)`MEvlP{c[V}/]1|;F]n:5p wg`@8\`vٿ[p3  \ XsY;QGy1E!b^0j88ᒩ.ú"a|)&gV& Q!#tG}s7Z{+^_#ȎX1%b2^T-w{4bw-IK\󩰫E*ezԩڄb{*n@㯥xlj"*vv.(x !fnoI`P5Dy3Yy N>yoKKk&TDVZ?#IQ9[UʚWM^R 3)RAl0 Y*5iוN^'C% IEA1!ς77lvK;K46Bcc~+ E1.1mxʷ,eݺ K_2$4&_Á7g0XX3*E5B{_7{a R`Q`~ HP^[4D)}&(5j S_!m=*Ccb\f@㷏5 Q@ IE$TtvUDB%1P%`$$ X1+8^#XrߺT T%RQDJDC4QHC@U]ג;Ti&"Rk,q$ Qypo y2ՌQ]5+<u r(u(b R+:+hmTuM]l@]ej3e:z}׫j m/!"myN|^exP׌*<&w;2v'Au(eChN'f@ 1s\ty[o 1y6QLi M0 Cre+WmgхxbMʡZ36Ķ&x+d2帥5,cyYRw{"A1GC%| `C6pj8)5ͺ?97&RXuYk|ߞ6@ ,75$fFw=M2xP4Hቱ Pe~z6s1DBa%|OzEߗ1l(xd_ =ɑ G=x9OBuPwt1V+*왨2\CGJ6ƨM@FaMvaW!j1r:;d(e:@+8L!Q\T{RZ*$<ȗ?gq~?aCE>q¦āb=)m4Y[x-F$*PGrB&:m[(" F Iu=k/λc U-RE3asMxUbmc߂uuFoLd\h`VK_fhEb `pȭo}K|p)W%=ſi]qxe81nnRdSXyԼ#\;23» K|tw&h9 `Sc}3r V b_#kRWWYx+FfH41|@e c|2}ڏ80={G,nw& /*Zj$H>oDx'Ӄ|D,]mLD L9ګ8n| )_*Z> 6_kSd/$2u&@Wa:Wloв7X^ I7y}:DA6"Wjwƍᆝ&pzJ0$6Ɇc^dFCu..ch  VC\ ˙2Z#(LK W-ʟe4^+kd'̆y]gskm;[*{ɤ(`P]fs6J ϲC$U<(E}f(A$p6Hyxgg6Bx180 Cb{Ϩ13REU++Bwn.t$Agem)^9pϭblɷS`zfy8^:g*X߶xPѳ2 q}&G3/L1$@@JkhgA+(sV^<#5ǢB)OLѶAn'`H f,_6|f;O<}@,"v4QUS]oߙ邒 5A#) ' :yҋ:*zU휚Y$UUR~?/( \WiiP'7' ;O*9@`] ;ad;aoTL`+vėG0V54XhBoE*܅O-Cl 5|s@ $quJՋMUPs5]T_ Of8sf6&iXzl 0406ØZf qN+:qKeQ E9ACP'?~@zŭy=iѮ֡^K{.^ʒ qu.xH<{WOËTi=Td|YJ#+iԂŶO9KE.劶(w b/D^\juD+,w1W@='{bTZ{{;I 2\0z.<N5LE+@oHC2 :&Zb%W3Lxz5a_k%nRj;'!@JO-A3~+ nbI {2qV{J&%ږOkv"1ٕicяo˟#eωMm;6,ω-af!6$WtOIw. U$_ixQ tն>#*UE|MF *uG~rI}\Oη&QbG /[Mtʙ3|k赠(gMe pܫzv/=Jd%sk092-zhrb v?PT,{,Q5 ]z;9>o^{]`EszIr*^Ƕ!nnE,.!'+N ~˳z^֭"&| =}Ggy,=njZYWv !U>N7Tpd}xFInor%_Wv㩽^|k|L \Ưy>^J׆rm$V1 yn8RPCב<7> Ќ4@fPX@滹)$^ЉtB3,&q3̆Q 'y5$Fx5 fKDSոW] sG}68SM]ܽklv Pe17·SWrzi 7RE j;đE|AB]avlK,4?K HZv'݋Tv%e%=-|fu= jMۜ^p5Xim$cҢRAv vxߟEI%ABAp}j8sD혐JP=!(R# Zґ$׌7:|rqWᄏ=$N F7ËE v32U${I:Ü'MVCHs]\2v#bYO||W.u Y1 ԦtF^qEq+e㫪gMHIDF1GLilyYl@Gav-(XڳɜIaw˸xRi z P~lǞJ9%>Ow)DACA0KLF|muu/p_A]"i4TujnQ]=3#CԢE!g,xHK2e!I!aeݭȯmN?(] M,r!+0'YiUm'q!uD $M:E. PP'^Zg}~ {DE,c`@HM^}g]=y~ 1Q@ hF(ӧz+*Qe-]rb5`PNmBPX46Sq>oti;ĪB#` r\#0qVF ]:._)VNpcG綠"U/89VH[>Ma?g=m.)cyx,M-*CHQK/(gDPW&Ä "Y^C/udt˭gRsiEYP$rM7,TlJA@;2̋ 1׷ ͂8%8_Hy@h#2b{ˠz;7oC&9 #-g UJm_quZ~4zƗF|viA&sSg`s9ӰZ  4ߝ P_V 3Wl>$BrtɀC Vu%xAS|q*Fĕ.cS| Jx#`D:->r=td٭(zV_7栗I'zjjĽtX#_v|%pg9YН_{#cy9,sgyEB ũH|[%b:Ot6M@p݋X g>s|kuXp6h|!|6pR|P_(p+A<{hH@ "l{9A _mW_sd'~^czCJ!k 5caOKآ܆47? !0JӖ>sƜ]}^+DN%)dʪQ^Oa8<ć3R!m5A>Ivu9ngQNi * SbЯ.)f;&{e,ͨNo}F;HlJ1]PxqɾH8qbDXLlT8`r(ơrȔ2ך" O.KGtBCJ໻jךY`5x"Fվ]¿zLɠ |z'MW/QQ 3 D ;|ꞡlHK"`Yxk&w%d`bS'=F=yCgzNzEP[Hw8@Xq%o` d^ aaDԊqEVNxvCfh_xq<E!4BH E )/t$FA1pvWUV5QjK"fFsa%s6Z̍^)ĉ+󾆪6#pL;57IIH0޷6s^0,K <1m$CoM砮1E,f }:^$$UH\ L#%;6!Wr:V_)_^ !>oEMh . ImoYA#;Nk[X+NS}aƕ&W?zEq&hl&-Awz-dyjgHxdNi_ KJ .~w%aO*GQ^ 6z(~@yB|a1+w?TЎtOB|<-sz)$[bL-v.Cm1}( Jt~6>["0eVWoE&$u={W0L0 fܫO&!&mʖ׾|kHnms2AJ>E*W CM 09Hm7$!e]g㥊th #(ryNY 埢4&x>1N=H#چLifLҭYp\1'TX%Z@K _:SbK{Rʯ~Q"Y+L,@3gA|KRԲ{q,0_ƫ.荚(Tf~/#623ݐܦ4{}*?Wd?Y_EU]:CqpC\\$Ϊ[;lmv:XN*, 3R ;Dz c(e1 Ssz" Bѕ\\Оfj ; NZ֏4jvy|LW]ӬkgvRltKjȌ٫ƹYU=u6`naj猝S gH:WLc2?m:/(`٥reLNmsz U G.1iS7?+ˆgmS* ?kcɀck$;UAp6N?/9 #af}'zN7wRTEK\)ijsQc`zws_QգS`w4lW?4&e_!_20D/4Wtڻ|yW~HfAXU I29,QaHd]U%\2}h}ZѷȒ 7>ue iVW0/h:uN-w9kjT09ko+h.OveːRmUb9tx*dh#^7+JPUܮ9T_[Ȩ@*ɥVT}s&wm8TkˁaE8)8if&9:2J$i@oHkhnfԍLVH"1#kԩTջ劌t 7j̚BM3FdA˪ %^"**pAZثWu,χDQ5*";7-߸]^p?Ngl3>w)VϪd9Ldѧ]^!8 *}W^non.=t4ʜՇ቞c6W<>͚~33"3 z,]~˧@d3> ׫£+K{C)Y>?PBPK@"%hpɃ3VʚwE`p`Z\EQe%vGCˬu!D"xV$>%}" 󅣧 HEˈ_J;_$A~Vp" 3,䉪cٳR2\UAp`zaحۏ|jX ZG/ *\zl *Ѿt)) &ZLJ"Q k;ͪj_~N~ZG2B}] : 7{#e0W×k% }Z+ETv_^ѴwqN]˳$DТ> E; W\Ô]gA՛o}»(9\Ǹw|*,*^ݬ`X|Cru`ї]o;Ob u /uBex3ʫRr!aK],V=tuN8JխQe}>)vєPUuYrᢢBv.\$K 6 *-" mLk\  a*ު:a&$EXׅTK4jmRՒ4j/WJuvWzUd ]Yiu*;vU^zV/H,GCfX[J;( ϛ<#L &RrZm{zy2K@P] ov_o:OiV\k)^F 5Q|~ۋwEzVETk R+|ָAp\a>gj@0T@eK8 Z&0D⢑#4!K!.4P,Z >FfYqzV͚ؑ-nb&<`kWx2rpe4j0JfT*]Jk_+a!UgE|VoA>CN\Ƈ2+*K:PGe!uׯ $'r.̽)Nb2$`hxGMi%N=a6l@z^:(Aq",{"eA0e[A CXTifn w3Cp:%1^qhDXWяvC6c8 сk ;lWY.L=:@BU[ϻOQ*Ŋv, SU|ހXzRͱU}z"YZLI :<D"ϨW|=´UCtl. j]xCKwEkHF%޻gZOL2SKi~Mr )7ԏ\z80+xWN{`g&ӵ!b߾I Bp22r,]dD5֚3.v5ΉU]MOh;KT\M,T ujD>s)] AlAD(ʍy RX]+#fg/,v߫s) ").aK_`" |iS`2- NDT.ko| .61^1G5z)n#gr&ibpy\Nu#[Z2b&0-b x}W,T4:z8o)r UIߣ G_M>?2;ǛcM[:C* HFMu X+HjKlܿ>~%~P "-^98!*ѡM#3c X_&*߀6[w'q+96Uf@qHBMv`6s2x@&[De"2&.CX!q<%AV.EbzT=gy;;jbJFzsmՔiUbm%JhbfiuPm?ETnGDԳXF!^}\叴0x٩ 9c:_ASaNB79zᵄC>?Zў[ҟ zcT3MÙob90Jp˜^s2sKκ]=nׂ7SWx!yfWC)Y4Qs,Y3*kȴ3#NrWS* Dk~#ЎWkrP.yMdބIUj& "h#2@ Z4)Ǵmw[ָ yc:SQkP؜mg} ^4~#{A"v)Ad앎CuRdQP:5u\>, !tEFw79x^~-m,57k lMx:ӥX`Rپ˦WSCބאra G)W/5! ݕV輁U^a2oEgVr'C$,cEP&ʎ`3. Wl7k $Vkx3C4*p|>sgf\abS9o4B$e IZ<4&:_a } ؆˲ϯ0EWQ~3^v@Ou#yXo@-ZdQݵ좞1jC!v*9\ݟ+ڄhQtqh@̼Gs{Q&z///3wbA3\[̓jxUttNU7ZXi꼠E Sw|8nUI.J8 ,:awgK^T_#dENtiU9g@jLK0ww=:Ag/BcK޷oŞnM l4DUzs]Iuء'in&7=x}Mȷ[0F qDL#{f%ع.]J "!APi vC;?LH#Xuc >8dɎ![ \Yaox{g& w$!Np18x+@G Scy `^e*I5 vj@Or?~'2 *a_W8@;gJ$ UY̋kXd*۵?FeDLV֮6Rz+R?]94u'ڕ´ZUuid^naA 7;Fț :ϛsy_eʼnR1q/cmb d§9Y'̀Rp8!X#uѰ&ݘ@7 m)Ӛ77 ޢ| LSTVapyIFNY@R$N:-noYyF\_vj(Sח`~+h`So tNjQ n+SKZV&_ފPyt "9!4þ[j :TNw>A]=Ø;mow}bw!=1$$F38n]94/j_-5T;td?M1id@b R7YHَ[*lU_`+6p/ceb6R2͔miP=B%ŭ3 IX3 >@u}cr`^6J,A0NzYN&^0&G&0&L)kLümFqNgfqbc|I =6$P8Qtrق.1P.:4Q*'(A #aIS*$>N#N\:WBRp h(<* =7bA]2]YZb=K"a%nq ̼X+k<~(vqqzmP6Z9~Y-L϶+XT-`ICك;@gKWd[W,< z&+FihuwFPlr(nEi"'tV g[{"GӗZDYz)7BϦhѣSwk87<5K =`u9xJ6m*sd -f ݮN;*'l3o8m6pКQԫ zƓ0hu_ ,CnbVMW!Ԫ783Թ7Pj Qii"i&D7Y ""X0}˭Sp[;αl3SR2w vwq&.hVCIyR_mZ椷#C4NWS82u2$0ۇjM5j\̚M<۫';/..: qW'/ cCb}]4^‡l; ۶byVUJbɫGꨶ՜sĠ,.ol9b:.xPt-}WVt͙N` #ҋ*QCvȵi\hieدtug_| MLM}/bcuEF !Y6Y&aq6Ƅ2*XJcʳn  ޢ:xE3;KK7,6(WݛC#ΆPT2Lk%[V#8n$-)RRr*etmxp (0H Pf.T]Z,{&PCJ-B_j+7iN]IDp5 tm+%ׁ'à*)y%Ah(<kG+`OeKlݞ)ql IeSfm[7Ho-@ϘxȤЀ+w4FZlƥަ.F!E쪾0V)uy((XPh03i#KoD{YF/ҧx{j a\jmjdd8lmM۫mx¥etR3]U!^5mh߸';Nʭz|wT^ f0PUnoN̙]ct*BHYt}Ŏ!^;;0?9:3p^,f R%̵؁%*a zܣyϚ <\1AFhi OLޱ1\ȷm/tSz+Re(3Υe >nInhgKeq6W1"hgуmu Mms䱩| ܙ aMQ%$TzQt7s(a MjrlP."%5h7)HC%hvo* ;f-MH*+'@8K)kgL';E`5|p8!  ]PÔE3I,n]NiwLZ^_86z2'[ Eb]#TYzׯN{UBlgF3nͭoN  7PUR6t'̭uh=ẩeT?Cϋ~eqI¹SPRkq|C=aau@RFtd >#hJ=uX<sX]5D9SU]pm`AfKyq*"SIa NzpϒwAnړnA$ڡ"U>K.䁊$-ɦOJ݄r;15h^\$&Wm42a/7J S.N6WebJ\c f\nBh[1  ).9bop\`=4A Du̇KC2;2^Ͻg> S`=Bw4{܄=l3{MuR|٥ևB0-z<Ǹ9c޴F qnȕIUȄsy:$'9:м4{ɰf|%K{8O{i[Y,oS0j! XK9g# ^ %}&!yyaL44^tAe6Yr8 n}sףBQVie fbu!.;##~5Qњ/2cfz+nH+3+Mhq{ȿu:ٕGD@]hjE "x{|!0i#=_gK߲tlq|pZC} .DTCL{C%;]ϗ,-W }JcۭK ղq;nCDm*vfT,X-%~CTmU/@R<;'СmqZ=7買Jk%<YNNue1MT{D74TWYFN*b`]P-cjpTZql. uCUJ:Rq^Ƕ j\~F: 4rg˅E,ΜF[J=J(t'!: .u4xY Lݗ/!8x0&M /^2\$:o!*l€~Wug-hRtkzAW.,5s$Js#+hA}QlvdOw{WQ{$h*~E@j6x_^-]5XW_gvdFܖ`=0!Yړzb@2Qn3O{t*ОNU=:oxxfޛi*oٮJ|N8N[Z.u@uhPg"'Zz{N3j.Pź%TgX?`Ov8}d>ӫN3yVo5*]y~wdېttuC(mwUYv0Tski u::j6}^\%Sn+K0W9yBOc^YoCp `E_ rU#\"~k|,o%9=>3/{;hM"7u2m($<,:۝oy̿6|j2(Gq;xxt,+l9kXnJʼ C,? ~,lpVv Fk1؝;&!LfD.hRбsn;7/ە P>HmUD3=T$ׅ"mWqna;4Z׹A^)>tP~A YCd0j%T^}k,Q,> V)(8^qTfU#C߮k~Cn탅[[ͳ+vk0^K3dyTs*-͚X#/M?1.7C}l넧odzɃb2hAA2 R]…W PaJh`e\E9|l t*0l dҴBZ}m>zbEwцiRVaV`LΝ>ՋfBxGj6wvoQ4r0]z>ɾTqJyL]PmD1@׵+gE}TRYTufƱYjDV^թ6ˀǶPWb>:P;ᚣ3gJ=ʼ"a,,h @"*6a&_ssAvvfqKQ7`S(@xʠDe}:jRvww8 .s\[/R2TM34q0ђJ>K5u̼;*{1bve3ma3T\cc |Y a?;w/Whג;m?>4w}-[\uVicU.=Kvz넀[<8fd>r!-.eRN۰[]xڗȃ^*ԯ5k{Vרu`DUm{؀ݘG_ .^b- SBwHqUoW{+s<)Xqa~ v]~mܽ!3fN@ PUdeҽTv@%c3H#R+Ch_JtD@ܬ5iVU6,4|w"GN#/NZ[OZYySRۡkF;(Vd?.KU -ҝ" sV{#DI^.fP"x<PUte# U~ƅsxr;zyf~.˽tpMe:*ӻglՎڳqX1WT}u`3W;Y8]țTc[Nಒw乍 mz*&܁)&pGDϻ`0Cx̯ dw`bOyA= CJcb:r6m\&1PT%)1 "SpjjbaX{ +n%OXCW^ӯO7X1Opf; cGKu)p+Nd<.^WInץ+ NK4eHW~OFfB<8r#m`ro'}s;ˡD2bA{  J uwBGxPL**Yr̙WFt&KvBx,TC`ev$&tr[mN0 7wlx!֗&Yr]CFaV]2[$PiJuW) +o)@&ӫ`hub5a\$زf1{f`5q%:(LܼLDL%a7_Hkmd !6('9Hp"CA$j eG۔:w-}zcDhwuc3 K,|cOpVd#8,}yinf[54**9po Y464K%d:f imjٽsCSYYLfjq[p1z5Zb`cH묶ˎ^C{}O᝟YaSXG۔t: Vo@}d[W ݔ4U;e=+*z4)ֿ,6#Q^6dwShYaA*q/9 a ehsѵ30v;$3Eps$‡:'/ UU(y'&6?4t6ͨ U 6 qzV ,`\r m:7|zwPU\FrbR< ;{f|d"" ei*y{& hJ<*UyI 2뙊8`\I ƺ5`{j_y<=TzkMrv 8rg1<&J›IvSJxLX+7% yႻ:(4~,W54 Ϯj[*A՚XGud~>>}eV*o6b[4fqeL曪EǖzQ+?հ,4.}վl֭eCu)xÌ haT-$PBkũz,\ZZ7a* L&XTa3H,OGѨqP2]̽;|݂nj(᝶DWv+IZ[ #arV>||)ۑ/j\,m_$#۔(b*ŝ82˭+`ẻ .s ~;uX@:Z?ui9Cv*<7)Yod9!)P?XD-v>>c*LIXGsp;m}_Zy,iQ"镸rvv!CmgqF+2  sѵS'tEYR'/{jcrA}RzdKVdMy%{VӺ!, c'fjAf';MᚠwWg/[c_ҚVHnf/]#oYgp:us[oVŇ`fqVιzv'/}v"a"JQq*?]4G:<\x #0[a00Q+ٚu\GDN氰`> 4Y2GüB3gSj]HgZ6ẻbv}π4كOjuRIb ѩ@#Mot%uaO2jE_q5O^y^U< \vkxg&"3RNl,+7R'pfo,譺',qA۫.]LHg6R\Uyt>7r/3v ,"q^}Z9^|la`קdv8Cifve a fJ QbhV_lZ4qRk6dW2!I^R,-V4Z6=/6gA,'gSg2&TЖ3#sXBk|?U 6YP&`EnG=<|};i2Jfܶ=0v<ULi@s$PЩwojBS-&旀,b )2t>cP;,9V%F}/s59Tn-#aN>v2;|,3ar9#Tb=(`Ej^E[ 3psD O[XSVȩE-LbyE͊)тYCZ\g:(yV wU6`|Ó\ UB.+5G =k#|(/YYI Si\]nDiFI3;x]EUF {WXx 69.GH{OvH9 9*㛪ٌ+뾩]#5: ( 1 Mٲ){ [4Veˎ饬j~׳ (.+=~;gύ {+C%!_Prg;o^bWC_=BvRߎO:!ep8zX#>sy\g}[|XFD-^S!15v|9X;;~` ~Uk|w̋Ato^Kq] ~jxwZl%W`հ L^Pŷ`7=٘"lycF+8xGkƻ`:[쉢$P:7u$0O1,L];"xl +&b`k41gn)ג<4PhLa8U'1~Vb51#cz@BAKB\fp"-q.".<ښ^bDGN0U"XT :_-+VpHݛy./PKAxV2P'{טg-sT`ǗU5\khYZ@K0i.#^ϦXg]ʨCwUNu8᱑٢/3e[k[A͸;u~s(AoBٚ^YU@+2ݨ1<\8llX6Ђ!\ChRȇLag!KGs,Vn ^x" Ap'PMMs\ayofa5FaLKeylfH{Jތy szhJo>bhЯ@"UnbkHj#PLxE DY6y_9= v^{}J,+xZkPW-}ZDUMXI8'LbkIKAPa$٠>_H'q5yr7m;'UPC$x{rpK;j Q"j.&fYж=dGyan^*`EEcݚƅyh3cf#N⾙O/8u֬ 9T}ɬz OU{WB}"l|{ US+=Ή#VA/Nu|2-ތI4?[@8m8hj&1i$&ksn}w31Tgoz} aa ׽_50kje[U'5*ۮ2s纝+_2C&NlJVDޕvJ3y=}W@]D||RL pi! LcAQXA3٠Y47K3!jъ<î%iL96Xlu/ YFHYGᝤ0F@L, \-EfiʖS-JpC<^TJ=& >53نkqݘVbɅv{mfi|3*VmDYXQafHTWfm ߅fxX~  $* /8tTN b9 hL4\k$Rlr=Z}1QU6oŽ"G_%eS]Ҽ᠃AFްGbǚž^| (*+w gW XTy +kdv}>Ua 3X>O}]`6P]12&_Q2mDT^ܾ0C˝YP"ҖwثnniQO?xA(rk-ņKq1u`~"v!μ5_v1b,c>w12/u}t;u;K~\lX^ S)Fn*65$vxEuEwǜxa:v8= he{WM nnJ" j`5Qk=LlyMN! 7ň}{{AV<\z#'882$ Qp0+4 OIcjR֌^ tJ ʄۗв35 ~fJ eʖK󃤋6BOϤ2г"* }X;{}+~譚++ۤv6Z?|}Ưjke:iEs} f1GUD8qj/32f0p끐S1kW; <BZv[C" +`׸0 ׀X u٣&,rf-gRc٘wI ؚI$we^{Z#>ޞ 8d)@B VV |Sd1Q GbmjRk|P75ybxS&cEXbTnytCXi{h9&w$933SvL _f,0hYmllTڶhX$bHA xܟ*WO{ Qxe7== tnCIpEs~6*qd^nn?1ûcf| ]#P\H. }bƾ69֖VCo3"ѥ.cQ>Vl5yx;"(^vL*M}T,@v7Kf!aQ f m"Ƨ#G(tYv|تіB1DΦ08boV9\󌍙D֣ a? *o']㿪-J7~)^XCy˞mԭiub/ {a7`'6n>uv禅SBfXΈ@;DZ#|!hv>T 5 F"e&y[LTF)WBD1 F#6cZO0A!T 泻vCᓻdwULޱٌffq`GPu7~RQgW5W jȼi꒴xu* ֜k;if)v'$eEMMheW1Q=Ω``wCJo]TDeR3 *ޚrm!YSF^Gn ԡ=iS#m%7UZC{6y Y.0eP;_$0'P$(D-!]ՖZt>e@ B|F`eQ O.|ߪf-"DDw$=,sP˻xz3*8*ҁ/ \K>b1x(o0s9U@b8ַiP.osdN4-8q+(e^m*yۗa +15PQ j aap$R':- yńT8pxFua)v]dzώs8D|=+6@-5nسJG&*a׈d==YTl "Dt"L"8NudrAV lT\,g2nQV,?zvX#*_2Gten>L)T>yY8jӪ: j <ظF_13׶;։Rb8X\m.83 4qxx#+Ѣcs^?4č G ~n`RG#ud|~߶{̂[oRzD\Hܰx&Ή!R*BV;~A;r9}g{P6wCH1ϻo; +8N{SIیmw97Lj }`P!o^U<l,~CS _CCuc`7c]EG9YfN" \,($I2fQ<;uvY:IT- :_G:bk* 9Ow dsT҄JY͗[t ggC5$%t6tD:kb6Z2^ _p9{~X/(V -&wT}vQv~G[B<-^ u{k&QQ HXFtwqz0 J:S]RN}d .b8 po1o927#˲5ag(/d:m6䍳M Qb@b^+ן]lH+"s& "hg赿2 ɤJ!ӌos(TXwη|6_1eDK< T㚾]7w.c ۧ%k[ь? yͬ_ ap ] jYplA"oj7wr[V͐2d ih<1"כnB"R.l2"ky ɩ~8:՚;i6*V^ɷZ^'8md8dtoy@"e&;0 s/;1>ʟKB*u-Vߒ;BF1y{},8yZ *h| bQUH~Cm}@„lכ )؀JQDؐp dyd'1K^y3FOLv:2Ɂw*KI\'28Xg$a:]J>T&<ֶ˲BK:t/^jx N@YUScGW+[4˪ ۿSEsǸ(u[o(ajUDUw).fu"m#,*@S{YuVoDxU}^Xء*pe^XRJ˥ȖmV*cG6+֕>H=TUX>\B {+X7xµ^\V֧Elz㙻4?}Yp߅A~3y]}hұ8];Pe1g!Fᤝg*n PMȚ:h ŞsZ~lc > ]t=AY3/fD;[w7F br"DBFwi =u1EhQs{v,.C=3rX4gE-IsNVx0  ρ/ħ*:We2:pk.n~KeO=ʼ4t9nj4:! t ʥ[\gµ]KcǍ93f?Guʊ͡V[f4C0 54ԷEĩHS%.Й:NnOHƓ ev pk&5|K+0lepIDA KꕂՌ~f>M{´%HΊf+#f x1dWV^yx ҡ(qG#Cfe{M p<~OHKD _>Y݂rC<>ΉI]*i=/1[q+eqanCPBW9 p\D7ׂvLm*dVUSXG}ס XD]r.ÚOWb_wOm>eV[V߅#iCﶆ~"iW @*A\)@tRR9wei,cY^`#*0ܣ-CU P{`u2B&z ~\OW: (S+ڱ3 gccjpͮ KzQBU\mLDb8LҐ<Q:=t;VUU a5zeyZ;%VKG(=yU<<}z|o/{Uac@7}h ^xbRuk^ALyFjorv-3cM'#RaB7pcm"8&P͎o,'Ǫչ0)fULYxٙZ+֎+:8}d__}zHw* 7eV#tD:p!|ecUD&\ϋFfYG{9wԐ{6G,g^ $K$3Y+x, Pfr.XRԝ\tFAr'surx[W-60Xt4ƚnkU5ء&V0*c1TF\ "fkԽ_]T  F}y~i1vWdwK)>$Ϸ%ey.j>;W@gôՑLp;LpDYĎaN/^i M` ݴ| e99 e=NZ%hT70f¡V%%t\fކe`lL?Nq]ewfD]{tϣb|:ZL,yo>N:h? 4K wBOag yA#43oӫ`_׹@YD -ܷ[5(N.}n2Od{;zB_Wtzl-![{ 1[@;x ;[H]yZ ioryWdG?}*_[)K}, j>1 1OJWM% ۟d˥!_]x2'&QL]6k$b,ԜqUM"9Av(rsF00~v|Ќy/Gxb*(wl=Axfx_ɔb%`IFD'`:|L)Ū^[B a}6*oZΈY39e IQ#l7.{G kq0^A6Bv+Fuoα~Ӑo+ 1kFybڡ+j_{˼xWlѽ [iƭ }ėힱφ `}|Fich&8ٍu!R6Lhlv,O|f.W¿Ӛ+m kAaQ$U|D ,v~G63&T(`^s' PK`DJvW > mYQ5ԋVi@A|& Mލ" iSnISH~A0l:rzprͪWlM% Yj-q͌ILsH&a!"~hxH]a̪{fajV4\ak f2,0Ȝ 0{hEn\ʳs̝z߄xwD)^v/=Áx% :b;E@0,5nUIϖbeR\ 񻴦1G4骢oIgX4zܺ jToKޚkC5T O~#˨zgMs\,%) s%o^=]2KLFdWG:˅C1@6=~Ókk;aV6#X  5xs؊s)ɴCI '|=(d}nM;gNi!a݇KL*1p\m;1C1RFdx@ѻ)$`C7٤wUY{;{aOR}?yᩳ]}uK`ߐC73Kt/N~2}{wmlj.EhW;t1O8U=7wc寽mUl<+[&ywc9C +2h#b6hm|G<2sKvWe.>8Mpk 4FJ^/xA iszsw0`r.@. .K$ijjL{-q3Vg5EDmLy[fZ♹LTWfD>P}ޠ;CF_ӷg5i}OL*#c=%~(7C \t r(Sn`u ]L-o @vVLLDưT{N:mATi 1ښLI4FRZ2<mzbF:ӽ>UQ^>5ˣB+9Rם+am+&m4wu?Ѻ> }U `*=VbbAPj8ՈP̈)5z%"{myۣygAf,v׉9od$nKyo~rfbb\>Y`gSבs:fUm:!YoՃuqoL5ܽnM g9+å^~xj /*e꜍Wvqb`dep]Xb%˪* 7pVLvWk'\c>9cUfW~o=݇1 8)NpKqlaLޠG*ع8v-1Δ| lddXs9ijoMI[4fp`81j ;>hɁB[0^BJcUR(kD9hfS7?>JNHD'^V y+鎱IIL^%S!JґS9ͺU/V,sHE\p/VnR,]_bubky#Tz3%ҙx+\}QyIVhGe5& bsDAI'H4ER;kI}SPY۲cʥUrߪ5:/>bq&& qqq[yExzQԆ]f7Uh"*1R卯n;{3t49|Ey0(] v^+9mȋ!¨ I[3r1<<͈mJu+s Sr:2f lOflC6 ڐ1*ʜK7јqcfԥµ52gTaJ `;ܙhv{2֫Ly@ us:gwp\f4(JaыT@h(A,'Tw+au#/h g򞋴|8:C=\S3oD\׏難 {qWbL ,~C߅ͻKxT]TK/1l!u(Bj裃 ]SˮAu6T;s7uk9kw'lhg.@3eݵc;%.iT MVwz2A+wSexV,[I eK#V3Yt(Q{x cF[49byRHr̜ljŚ 2v?O4[%կui_oL:ֈ'!;#moErO6^J|8,ej&I !dȃpHÒϾJJr)Nu&͛+v c3 $,fQ,P`eXHSQ.1{ i*$QC`i)Sxa1`/: Њ_"`˫ζGGHG }-$RCŵś!D%Y&ZR#]դEY6P#Vww1BY*f!2N]H R)EcO t4"oYWC0Y^_|v2B`l}oQ=GhD;"|NyԛdedMwĶ݈ M,x0B <̖F?`v~VBC>kXR&k&_5W<OZ 5p^ *:qiUAp0qŻ9;vFRa,&5y~^K(,DԩM6h>yJc1lg[ub8ZVO`8o7x^ONB}8 mR,hfˌt@ԎmչoJnBZKmBr#H w&fYH)VLU.8YH)'k<>WW_Rʟ^T[|'c@ im*v#g4F56gGo ~ dSi Kli,r31I(5 ZJ7LܭZM9jK7lpP5׽~ȠjEޢrٖ >4ETܞڙ0ƞlu3B񑋞_40H%Lδb &ל=0#} |$|o0`iݘȨ5O)ŶdF# hʨ.!!3 PF RR1)I<& O9c0Ie{򽦩ˈt[ @bDN" 3@,-%,`*%]'VMP q ջ..ja6jn5^R7@ @8`Rφ5Q`貋mR26_tPCͱ~/n}}ͰѣI_N,y{4bJlk_v0?>xkq=CY@Ty>;勏f" ,D4g{;HqdPcH>F4g2#L^1<_Yd@|ɢ f}:¿TP0^C!>q_vv<2"OMig&2OmYm ]#mek|#m/TB#: K3ŌCb))1.#Ǝ"]5,=9h}2^(s4U4P >(DAM0IYQe!>O3;zۂYdhgY^J* *"';-afP}#{Jb*///տW~Ӯ1HLuzkm4XdГ^֫'^)[JES^r7dMN+TA;˕̆=[I{alV琇[vSkLTu"Plx 0jl?EI>MBpt~h4Pt.2;8+'1A(3ہ3*e Su00DjϗC='}_ּۧdRZiG\wvm 551 cZ0X0mhFliM(PofA,xi,num$ ?=@{N^<>GbAN[D.|_qd<0(9Rwzܺp[IM)BVxBijj")(JjQz;`ygyC&I a:M3Kz=ݲ`c51˚ۼ߻EQ]f$ĪѶwjrI&q(yT"Rw Y ` =?uUVI|rks{/)4>ۙ5Iƽsx_LHDi$fR s09fb)/=pd*☓H4A&2` ,r"J=!pa 8ͻƮgVuE!L;aglDR+8;v_4Wn?w}uxMbg+ >鷉'Y>ԔVTN:d2|T!=#ݐyBҧd/:ea$wgAA;CAH%v8 .54CH.QAύ]ă\v uɦm*/)(q.L[mU>Sݞ߿m?|rb 1GϾlQANo՚ :ucJYJ_28 S;þ!cB"fD":n^(V"ˌӬ" xBe=kJ H\x3܆glNђjvy{t `A5``3w|'GRzI!̢L-LM8B;لHoWeMC=3'Lϙlqн2%cRQtЅlI&.9 VkfřMSLvw;L- UU1NjhC,HxItH}m*$vܥ4־ٚ$1*ZS-< zoV!e`|p* j}! esVLKB!0z|&CV0[h&N, i4. y CHzL^!O)b1:ʦ[d;aD$UOμSϒLXڰ!7Jy[нc "h1b޿a${'%[ OIƆclWz򒲀VNeZQ }VzUA1FA5ݺiYRLU7ODV,X͘i+m0t o9oe ^3")>3P֊Ln *b&*Dƅ$^5"A*lI HU/l:$n(ՐѲJJƲȷ1(oN_d0с ``&U EdzC[*Sm=!UiĈ!UĠ] azCň4nm2 >5VRD(* I.'Ô17W,0SgE3b|X]A'uL񘱁,!$#<3 fX> NFr@lh >VX6X#/Y*ɀ0D@i&!{3z(,;)n0C>7E}Er9 53ټRq4g3XAڪ29KR‘9q2,]na^3l٪nRӾy`T0lhV' ʽ|\KTCA|6eTw+ږj8ٮBr"XݭXXP3Ģn5a=YB6-I( ;zŚ[ˠKݎE6n fyIk>qyt!C3LLh"tJz$^WS|=;z Da{/*f,HF)xLyl#Ɔk aiZX$ (-zz tFPl5-yaޭ/ YhXHm\.2osFB[5*"CWǡ#2NJ*6aD)+_i$kDcKmB#X3x,;x J'97pJX6&kR   lF$!( ZOk6IaQMRyU;ٙ޼aX)TC-6f lr2u+:0*j`T1&1AAiY( X3FdwqBF]cZO@/ܠL1u rPۙrzē 6M wl,^uw4aP;3yw+\qVbZf4S 0jLnt+ ٶJ\vv&'\cWjО lRT oD[Dќj6:0@'6 VSz7etkE.kPY3"t`3t6!UR{Q,p fahY!J͠ᄉX=RS[КUջѕ4D4 BHQQjDhC I*FM.\t5SἴYP 0f50WJu4]4fbduJIR jܦSZY]ܻZ4@Df#@6cGkY[f2cT(Xan.t9Erc+iA6(7t׬1h@F,rRT$66ޭ"Gh$d"V̉4pWznc̋AJ2#*H2FDHL"-ӱ+(%͐<X c ps)ӎ[B!3i6n)!<WkC^@4VEXhS:4% PIe31n)8e6QU%4n:F`ȃ"uhuPʖCHJ'+2gN=0M przzʑCаlH&DųUpkFfl'}s%Xfu13JfGhX tkRb\̛˪Yۖ]W(S,Gz$+SIG3 :5l'T0f:Wɩ%eAnSm 86«w9yy@]Pq;CLF&!mfZ/#fi3WWN23-+#q8n9!zr;1da]x#6'#u e$ $U }BE(ЎQ~><Сᄕغp$S,H!dȕ_ ^P( ;5DM@ t1SiI`FGRSoi:%  4B9vחm&B:CO-X:0GW5M]dfgx6ew3TtȈnh֍!J8 F*fxfޑu|*[C" )i $${6 tO:GkhcXz&mj98R [PJ؆f{y23 W,Y.- FTeML-ެ7C&33M[ iD7[r&2mѱ 6J4-\۾1ynEᬑ;ݺK 6Qװ22MQ ^*(`րgSfz"$ESW&sN!:tjXW+un:mJjjR<3<׺^C=+ 6L-:%3l)rwTO>@gPg1ml{P9`2b$u;,! &y.TIY&d *IǬ ň!p$O\`ZK,IZ4FÖа݃pptf岑%{R|Z~L}7i-wmȐTh21Yh'P4?Lͳ[/%"pJ˼5Lt .`OwR|ۏlB,ކXMB6yfbW"8J'%4kP4 }bbI` ΰ_Q\wXVz_GzѰlhbN#d5Z4!I5 9fNE]jDX6Y@b 0R&hMOi&($AұmEB4N4)IצKm98v1#i)hPXq"HTFLyǶ`iXwu.Q(*B;,"9؟Za8,Z ǚشP^_h@d0ОRiVb{՘q!tuXb2zk*"5+l 3siNVsCIz5hi1':`ss|Zu/At(бi' +Y 9II'Y/7N1&Gyzsgo:0<43 Ղ0'S;5ɯ\ aM'ca;Gq 0Xy4eXOp.4ft3TIC'kq Rm='N#Oyd4峦Hai "4'P"|h!,[fS~fxPa^0;Դ6ߍ`)=ҳb5'{,t`V%uHsOR+hAi34ZbӖs!w2@`aݲg6o/l4'$[ECM%i]|lb@ُ% oopkCUc@K8%ZS4noū`/M{5ֱ 4ׄၖg D9zhDyM v퓝Ap<,gh2~ٖĽT/,Ӫ`m ۟4|q TC,mGbF!ť"+O0)zic-Ѕ,#M+K'9d0,h^3=&iyxůgַoۆ(l2 P4GUT'lMqQB"׉6,uH\>~(]rP{&kGÄsf]B8!̇Ai6aqY i>rax|;Q+x<õD%[E"!,B$ndr23F4[|=i[m04S/p?fPAz x]a5K^nC̠tWY5Mx<-HAƖ6סbϨG^RaI8waXc!QeIVF_]^Sw4%NسP3`ȘچZX=oh| bT>uO]hyh6~@g,*<`b,ٝ3P;gTLT5݇i_,vda~2NuhS ;f߆pWVy >}_Z1"/b+,Oض+'qF20̴KW=>{YESXi.$=m$N@B) %Ԯs<|rc Q+c+J7B˗qZ=M0+ =ćQ5xwEЛ b\W .5:{f\ هwlíe״#Ɵ3oo QXXfZ֝eֵ(ۖRƑmg\ 2 ,J,O/zN؎1wV{0Zcis0OKR :aA9h0El)CO yt5,_vQvq'Xzj@]0,i!`W9lGQ*&|l4r?xr?ZF&4%M^=L\DAP40%t: l2K +aSEٕ /ot$iH'WӪ7"x-&LLHZ*Ǧ@~TQ@dJvY+H{7/MVmcEA z֧.;oV ]FCtOW.֌*ExB4#^ˤB}`׋Ӫa`Uȅ31Zjt@bC@D&ipa::0)awձ=‡nt91YxX˧@^pxY Sc-HSέ`D| *U{j]J]A "1r߾gd3#^{ǕAcެ` 8av\:2, H;v8yۏ>.|+ÿ(SBŨĘ Gi- E#䑘kUz^Jc a`*q|4F'DCM \,)Z1O4OWY<'mʙPb58Q<y/%-7:V^. _>hNOWMQ% $Mb@D34V|@$?G.h2 S s0#uvL"ď =Qp?SqW(%[ԃ<ЁIe8G K mlDkĀ@ae˱v0XZXvɴ>` n_2)W/kH*HvzEC5cEEPq<@J|ou"־eya0h"[^~ ӿY.> 0!1Njk G'ۛBJl 8F`Έ`B6T^m浝H$T*.+ծtT;hYnע^+έmb<7(0\^j߷>7)A!BAO%dL9IDZgqp^?'"{l}J҆>pM|B܅EL=]#͈qXiTU(Oq ZHn `hڈqЄ敘ǼI28ГEcTum v%|L _mE@iqAZ?ԣ6o?~y?a"Uoඳ/)V)eG[YQ҉H+*PBO }x&|2Cx&++|T4'2rzά4v0aD~C5u_Fޭ‡Pc>xVd4@%)lG<+QO[r0d_;u* N;SJ v<⇟͕NJk%!jnc՘0M:X5P1+5 9?UhhJnaQ +}L32dBgQB&AB9 ] a~Ex[T>yI KzeJr! IwrjQ1y|02޵lZɊ _Ϗ_.]fZs XOwO.aY s9vhc>XD!!aG0xdÄfQu=[N؜PCuT2>FjoDެnS QvQlnn%D+ɤ{}h%/9yX~9/!gRmdR(&N`uN0AQFe4u1٣fpUNeSt("Х 2Qsb l9S.(o;mdh" Ė( 8-1Zuf$#%,ziEǍba#xuh}31\06J"^W/+}r&k;̡ņw1 K"E>`Smt°A rZYALBdDUh?Qv~\^ 9Ӝn],,G{/2}x៾GF:Qyp*m -#1ϋ:NUDN|hK0w׮]Ih3lPݘ=|E(eX`ƑOm*onbETTڴƭtmPL,*[|bgZ&D_;5/ԫ*X(T_t>ݞD:~-4:6eϛK-k,EMܻɊ&e0Q\`j R%y5v*F 2lt(nLaQݱad(cԍXtbU޳1\5Ym_ |y7E^4UDT8RtD,>~5G뷮֌uPD.iQ\d(  F2`d% AR3u&V.a>\z&]S睻5~&NFE *Fvvbũ㛆؎AN5Cvֱ*pale2QiXd(YTEA?+kǞͨ`gXjzJ3ª􏅜-} Ut Up# _]%6"# mm'|X i^阇Y,Β5{p׫>~m>Ov#}oOL|ouc?} ڤhaG^oôޝP( }O)uS^3TbS L7U7ݢZbf39wԧ-`FV ICDAX`fa͇\%HHvWjt|4wmhSS!nW9mL۴'HS2cV&i9aiVf*iKY>Pu; &U@-ܲ B 2ĸ_, Bux,[g" *fgNudXKA{{8Ag'VvhQ(dhӘ#Ͼk2]YQQm,UF &%7h~Ǜm3-UŖEO6-65F2+hXʧŜt*Z~Y >xu'-"y_9 ǭbd|Q:1gvsX`RZ,mDF"DQ"cD-(R53OyhwjLu bj=%my31GK7$]I.drk[-ó*+Uv{\\߀ɫ @0c)% d 0BB -f݃5f\ꌓB8t,s+"l2,(R2! f ((hD+XOg c4VF֔AXYMfN:Kp|G>-cZWuB2-;' >/~퀚ˈ.cns)TED}Zk ȍRY{jby4.F=N 3(#Bj1 A5l%ce)y֧ᚶscBRv!2S5 aQA* ؂ h8ب2|e1ϋD(\(jz0ҽ[Vb>VOu'i_vFQgb ?yMOCݬXEv߼3ݟ9AUU*@jFu2A5PC@TSL=@eŬTOupXǗt5d)vɦ)𗖉lI`I&H߼֝SC 1T0`("Q)lidICFn="/wl#R,J[(3 +QP} jGO 9Vq1^E*T_f2}25Vg)!+(o]/mT:d}cϋEYN%ݛ MzJSZݶm6OXT5M&8d(: q6I!p@ޔgGtϾ,+Lgk>A7Dh$R%Hl4IAOYR7VD-IQFVFzhҸ}cf>|6tx]R|QZ"3?je_iG&-9#-ɜͯ(naB4oCeS t_#h6 6s  }߽VthJZ5>fnDqn.Ƃl=wɦ_; {,ZnCW+mO)h y66Wų( &&iRQ7"DxտLX*#D^m(!1)`NU7^3.UDr,TF"*Rǒ.5\M3PksϬ 2aFAk) 1H*JI )(if"*bѲЈU#1:D4d̋ӤcɕSUY9\$ETUI$4TA !K * (;2*c G""3F媨"0P{Pc7-bȊ4·}̺J[w&EƶcUGpq[U<:2e%6DvŞR3z,NEN1W-0kU(%g.goz JPCHVF*ْ|mJDq2G%"j:pLQQ`J+QDFүM^jF&;<\Y2VyDl]&"e*,-ȣNRWEkQѭEGaeTQ !XtRK0686Éc(* JïQc`?=ex?z8FQ}LU2+;idTD,1" ?O`NS<~5>[e6tEP1"!Y"xꉗ凔l4jhO5BIY.9 H6"KIItz/z.]'OePÆdBa+@XdnB1%,4!\f\la"̖dфRdj$2מi>o2)iVm:hCBI1]e8{ȀڥYyeT;t 9t15 *Z5 +l_8C`[َX d n܃J0RE5\TՓˍ{DUUeQJl{=p1\] DUPmۃ'OmF#=}2ݪYm{b^Fڭ7C|!f]_Lb;83ժQ=6$z9VjȲ5{ ҟzg]:|SY&،gV +gdMS`L/=kG^b?-^w9Sŗј,k.e \mbq;C<< >VLGw&Y('`*JuFSQz3|q8y})}=eb1,ơA`T֦͘ m)OyjEwa╞|f1TGP}p ăG}1kʄs)pS1fU'4Q$6i&jhl{ mX7Y5 "0 j;ZhpXj8sb$QMDQC2̥3ABɬR!YQBfe(QQȬ~SV`o+ԑzfT5 z3 d3rb)Ya"p~5bhʞ46狃e78|F(UIAIU1GDH>k ^lZڟ2oX=4@Q&{+d;iL%J b*& "bIh")((*Mf !`J"&jba"6 1ogꔱnMc@`;z6Wv} DED#1~s"ݲyE[щx] ETakLM {2X_yEks. * /b<WޯGt1SMUyqUzև(h&8#gO.042Ь*HC1]zp_1A XC+o3)#&35v+ s 7޴MҢ"+>*APUR mSWmLMbfmGȩ LqmD @*iӗV`. pZ'9fe(.QEpeUQ`̥bm7yӋa_8̮,hs2EE#uiRSVcQF(X'jj")2&SQ.**EyKQqV+/d6,R&d bk)K`XjclYvjs3ҔEYPCDVw [_),Rڢ7ݙ17X!3yI]-Y|q32p}8C.C"QF ~3z]"ܵ*Q|ծW|5貢".[_R"իN,A#( b,S3cn4UUr$D!Q'XaںO:l#@ fYhQO-ekS۵s\2q2+)YJ>|R" !H|WE;HlAEx- rWY~symhj :T@:?;G׭od?*;d>IQ "Llmki)Uw\t` ]oj=8&] t /`5Ȇ͚t?p/]qZCZ,hֳ7O9OخTSN{-v#JtI;͚u-,>zuM!_0i@Qu"nQ؋3ΫxOzlQʊgV MAiukh*.Yalݢ +(]ru&Y4SVlǷJDV0Lp\+J_51+')}xٞ8QĶۘSŪ""ȊIQ?,~uηMP1;J]|ͯ pkh% pVcH$j-lV[ݺM):f"z:}a X`!@<> >mz2*-Lį~ɓ``1av2}3W۴,AeQS~Or*0Im|򛏦ѧt;˞<%]{ [K)|̈pnTwq5B8^S?ˁo'ɏцsT3tDJ*}ֶYHVKk͒w|oT>P>/E:N?eB[ {F~ĞpI*P0/mzّbkS壐Re0/^qDD)zk;y"iBr/m%\/H[б=$v/;| >nNTYE"F1[`dL~Z +cf5HTfʸ1XU'nD`J,6+AJm/fiuEUUX(gg'@#֡WC,/ܙ-2ik)aep2'%]cޱ1)c]mFJ7rV[j}84SĤzMUB+!Ng]DЍKf))ĭfiDEQ LşPPTSJC3-%sD)[[3eDߙڵEh텴~[zG(\͢x~YӴqUT3 =eN DOe8 1Aڈ=@w5hcACb#w ^tjt?=%~&SH(?ҿXhHMnO c0h3(Z`a3#Ix:]=y38f gvN0Qxa-Hab%Z)º;fݽ2]pdb,>lr'l9՗!Q23FneB!i@80 B53%=*}p8}vRvFQm-3L:e1[:o͠˦Fi8leM4q,v̵ڙMyxgFyM;d2TAMaOfGH{āi6'I^iЛ@6Xqu|3*Oc)ۮPPILW3y[`CK g ;"`Jgm#-ҔAb1M6qh0U os-9pAه:ٖ49W%04:ŇRm@8õIB{Z u l Z "o(czefӚR '; c~(xŐY 0r.TE"P@AO)1g(bZeɣwӫau-pHRUHXuc>Xa4^!CiyەFMM^ X\s-?Rk%O?6@fhЗalqhRyk+e\a%!4,EEtNXS1dh=r =+R&PRX>r8cia:OM2ag{ܥf Ҙh=^igHTaL xR"ji3G@(%fg0qdvżBF!yRLHpEbVP-c "G.,2ک@ wPI!ą@q1Z.D-C "@r:Ӭśb:WZF>n l^yȐ[Y"g*\B4 e n8cz#P%kx7b ′aEJTvy@ok)o+(myFY.z[w̨|m"'q@k5I9Ȋ~5B c&i['` *{gvauL/t:=!œ{ǺmJB^+ u: );R58@y [F9^`'`=X`̷g\##g"<ջW`)CnED@{fR{[-*PlG @*y{$*)ћLe4m[5s/ih־?sF(#n|⇍c$U.;}y'2&2Ux/z\J 2SUɑ *i<`}h^ylBa#{u.}sOG+{}f'<Cm3ͦJqNWC8Z8D&u-+2ѿx@p-DL0& ~<Z0#0W"nSb]$ .uzBX\uU3 >mj*' &h:0BO::n)D mp١kڲ'x-M!0wd"F),)3柹@!DoRx=ALhsHZr.mHlAq6awkCb"ˈ|޺:_W!I\؝,Τqɯ)!eq0`? sllHw>ϱQ4EȜZ C^@@AH-v4yӊ,WT2Q:dV\+[YF06F*g/ڼaeCz{;kW"T4tH/ x\)d$E{>*`_-$J@TBUxԊ\V`t^ .}!"3YzUIfPVX*nAD /EQ\ҁB2ba=t4ת!-T61"E8~\"D*ѩdo$԰ä' P^@߆ ~,Q ֥e h:)-?(6L ϲ? m_h2!B-ih䚱 \^raz*W8Nv "t'wגQ70 .魪qa9P#$ ~ AImPULCYԊAUT4Wp4_rRи)8L^᝼J){tOǼ1~ F=^fdfEֹ=C &H8*Zo={5hT ~ʇ(A.kڊ}vc.ɢC9 b B?Έ :}'4fv,xҒ`}kGu!)Fをȿ-A"3 9{Xb !+"f,a졆wn|װ/CC^\$~?A)z8Wfa59g൧yqfI8LХH|^"L<{a:$4 <72DHfӇ1V|N iA?55]p KҿW\9WrV4,bIB%բAU L;A,`_[orv;~1:O @5| `PlavT 0ZBcT!9F'G4p >dFԽS" v=2H1Re*(e"0 "9D0x~y!ǴkB߾>7 7zۃ=9kS5EjpIͿ~UH8^| l(ls*dԿ &oJ?7bW PU1AvKvZ[qZZ%iF" a^ zC[l&,Wİ1*9ťSs+̪VX"CT\, 0v,wTs߽de~+ٷx]ûOq'! 7J:24!Yc0#i>@6Enh)&#:Dł^eFݍLdjy ,oƎ}2iI Ϻjq;Udet=HrԐLڸ !5QXIKC\q$MVzRo {H8YwV"5?} h)3woԈ`wS3dH= : j"c?NnAHeBZ.4 %׫>_8r-OØ*eu?H.A@b)j$Oi`<0 {f5we|BT0 i@Sh)i FMيFg:C@Wz#D/wVzjWcgKڬGHlw1UgdoH88 DJ#t]/lO}U!8Q/cyAx!v9jiPz?q\-TklMb& Ƌ0PCTz Hfgy 7Δk:;ɑE~VzkUQv$|XU sέ-X"~=\k,Ȋӽhʼscy5UE3ͱY0k A UF(ks`lblrC3]#N[**u1F"]c}e /%@CTH>g:kw?NĹQ%KmH-V'S.uV|;p6|]eh1"0ܲa~h;qSiD,NjZʠ~Dk'7r8")YD]gAWʕ+g7', hDݪ )jthF",U-*j3. ֍yqO*zpon8÷>7ozt%d:CjpL!eOtnH3!:l:yO?sVpp5^[zj"-]yEbaztO񼂶7`QNh[4ջ,D@Huk^.(EU`)mr<5kSГӫ_D5{ Y l,)-E&ZfqNg]uiI[MF0.&`(j!KӚlXB)s : !`SyZfj,%֬bhi Q_ߞ4t--x\oaC_,I}??Ռ$af"={Hx_Df TIa #5eDVrPށ_"͡$(ł"/kWEJƮnDTt! &XQ&\Bȧ@XhW<-ݫ;S|9lOgMb2a|د;9KXh߫+̫s,T|в&%ULYO.!Th+'bnUc㮳}g mk[OSP,G9; |AzRWˍE B}>5?5c ̼57b<,+ۓ.kovzp1-)㭙3xЬOZт+[oJjnC2Wh+|]gMHhS~%8LS55`ESѝĽߝQd;x#'mCD;jEDZ5gl펭b'*ʆx_b! Q I–<"i- ^em./vNۋ~\Vz RUTQ!p|Z=Yxf`YDQaƫRYURX|?t*A0 ,>b +Y}lv;ϝtM}j,)il~UL2ңT}}0?YY$b*;uK{!DY%4yuLE>˒k4v[2$X~J+&b4xҖ61~^5&+S}pb5otE۱^g g^䇡2w%fhwJI9íD-TJ1ʅsO>鼱rämVsw1~}8$LkVCT!XI册q&PdS)?vˠňqb ̨)m' Ll;om}d"@ W ɼAtųƴL" 8١ ^:rϣ7?KDzN#qkМ3 )-Plaxq6p_(l~b2v~I$[ĵ/ =mUn>_*[=01pC Ǵs jN1Yu79C `Tr'mWL_ϯGONGWtYS)+cR¦OߝM47N[2=MoPEDDLwX+qݪ6mgţUif2"15J0W)dVxwi.˘fTPb19CvNf #V iޓ)wɆKST<F'_5JFZk3YS.`Pefdc(۷20qQt(*;N=AQS^&rUS&{y]2nmbFûkFƏ9/m`zE9:E["öѨlE~iUMu|8jsvUH룚7hJoX)06ٚ%VIGؾ|7oqlw8i mvYes0l#&pDA|BZt5|rtۃO1 GwcSDGF`b|!ad!D҂m9$KKTSLǶM34SD43TkNBTPA T1Dֳ O?/~ 忋@=>Fq0LnP-OgkY C @8.2_HA!߳՛~{?WR<tb1HTH1H(!!w)hņ_t2kAd 5$RQMTD3TTQ-DBP*5S",SOWGTZSMbn5٨ĈN X Ǝ>S9K{L% [XiSWU&|'(OJ/WJ$\xfq]5hb*ؐDt DW?ңY_mn89UiOz%+P%"$!~,$* % VU bImK$V"I{AU2d/+^2/fBuFiF-6I[pV/F# 1=8qZmhD}_w AuD[lRP3""BS?<g6i>͡5W=O_:9lCi`4uF ; m~=s3ški[eY@Amv6ܰ̈cc)CAі%j@01EU]~h"G53 m&7Af{ +d3)HnSrCLԶ"jnfhAM)*Z" G+(RJI  W MRSc, X_XS kخ1L%r,08As;W et_H7eA!F `~­yvϝ|7DoS+/Sg<9ĵ7>}=աyvb_?~ƾ,|O,7aX"}!(N1_YչxQzk|&r1>S9σZˎJT BD-Ux#$g: M2X^]Y"H-UD"H9XDUZ~W8؈D~-nf8O4f>K<[q̲TThX,`WRA?,q p!&x̊yb,^^oLAxb%3z"xPZ20;Jv8殰Gwek.Ϻq/woꛎois99(ko & "0ã{T3枈`3Hy8 2 Dቡ)NBˬ*c>!ѭnRТ"A8Lbm*'aJ`2d(%or{OkbsZqejd94PMyCx4 ")&Y2J^e.3 0ITY`5c +m*#PC :6B gÕTV()撯_'^4|7f1QbcMe]wWcJ_e 0gnZUU>iS؜AO>Jy;6C;:17 4]0o?Z *7C'tolW¤27P- (uJ2׺c@zl+"*]R. Fel*c"SYOߋx0>UvFo5v#pXRۏ0L~*dM!G|CUjMox&;Waqv h((g!)6vf6]Seb]6s/6z5nyeq-\z'զ(k,*Hl=eG?փ-4$G,I`"W^NN4RoeTլLo޴h}떂3G£USkD -Us֦GŢ,DbtӦۈ#s&V1HWHSh" DtK l2IJo)'mPZeZ,TF0cJ_Z,AWGJZ,|f1AViy5"/V|Fj`*vɌgTm5h+([ڝ5L†a %q2HKgʊT%OIxj9j/e*m\vw+1]B"<@[*SM Х eXwӻAŝĈHR5&ĉV&νn2O?o ^ڋHJ@Б~cy6wA9i]b ISJ}1ui3%C -*GlF:EhZ B%vum\L"$˝6-&%[7"I b&4CNڐ%sYuAqո[KsS[ғ톐4HBmJM b,6*j jZ7vl kiMfLP iRt{ iiHWMLff-4(q (*t=3hMV@7nSgbnSg'i"-#W@2s0D9C֩ 1+ ܺCI 3LXqCY M@KY\oV&84fi Xd̢J(rc , leC 4Hc)5{1Rq5ӫd6\JIP٠&j١EAK=;`fL<@JYcpl"!j,\hqN)Yu5!44z549Kʫ1JFhh=:kS{;M5 qr|P;-T 6ΘsVvסNv#)^b=l]o}䣹+İo a f؏=B NON'A]u'H3T jwn+kNyyd4<'N^tŚd~<t!خ0Nx:4ʂݥa41]yfͬ; `؅-{a[My;Ooir\~4Jh>1"`]q=Y96}uG޷==ciF!Aq .AyM*ӃpA_M F uspDT"!LSqyohgl_5В0!enka%#[IzBPxzWGŠ-f4H[X1خM)(k3{4:su `ؐV%fs̬4rǭ_e=1ƔOt L|d` F`_$ z}p]*Ri?E.Ҿi3Fa#Vd/2Cx3!nPTe&ҫ QU'-+sBK\46fl{$>ÚGR`.M{^TYY #YjH"ӢhvYBA\3⧦}zlDgw/3Oq+-~k,i5B 4b"AYYKm^A^ ](%Fg[V$6 P# \^uK&_N' ܳk6P(>d$yٙ`IקiS7W qSXC ɞ 8at&(ڞb S1¯hd#ҡpka<nTo9_6m .)a'ЬjjŭzDgq`B il]M[^e{b/yq{Ǟ[V]9JXjbEPu*G5ǡxWVyϒvN' `1!T. n)<+|av)fB )G@{'u6ij b~0R>e}٧pƜt7BC(YG,(}0'PQ'ٯl7"dZN$}rS1A*gX*uJd)CM#q l\IhF͞:Jp@P >;0(׿W[F8\V@Q 7z ( k:ȵfVa3-f*֪h(yabBZaJ a~C[^><"6 O.-?v1cV>)cAu|<$gt,;oH\0C p  Zl y?~^K N\?]?=`&!0viG2l ~>X`g(~bu;L9]zhm2lM \h<)5%꼯yBq?Rσ@_{g~V)qkaRoWym6qun3œҐ6RpZګҸTaCԣ4{38İP_nFvJB0{lI2B^/yXc 8 24 \Pa`v=X iwRPV'vg2!RG*k߮3# J($ B,{|׊9㺎!j$CPNr(`j#!Au1]?H*Dl*'=Qү!<!f)L jos}.\S=x)P5ki!+ AO;4p}m;6+I4`xA]ưnRɵF=+U/{^}jK;9[LfV9ˮu< +HY Of>9힟m3-`Rg-9)EEؗ ֖m]uN{k }Q?IORqQ~ Ӗ'Ar͸:sEt~dtl'*}udF DgHN!~6EX#X 0IU@Iy* θ_l KN > 6ÍQHNLvsU,ɯ_Oj" D(k8U BIyyƠ)*d*iIYHIBfd xѯ4bysA (A$A( *$& " *)jf:2q5>ȳ 'K,<3<%U\Hdz}؜c.3P +do Sr_tf/9׏M7EAXAQX2A! SETFMB>}9\堼J*.` 9RKJPD3S,D@MC05RMEUE%LE4ARAC P4A%ATԓL-DH@QWePTBALB# $2QIITSU 10 T7׮`{z GAH&5_au aџOA (xki3 e%DS 3Zr`'٢TkEجcL}ݏAѨ  rZ>Ѡi"D5Xöm+]wn |`5\-T)V=a/AXQAӰKcꆰPXI#jgXHBC{OxVڣЕ !!dDA"B 7>bEUUbysfy*kX=;ڝn#3T5h+˞4qd30Ab2_ۨDxJn: ,Tp U<9˨4m^_J15W3PMw{ppjThC&F̬($p`6!FeF0X JZ0LeY%4߃ C':51|%#AL/֞~<)'vI:!*-L,YǮP۷:Z&Vlg~>O* 5vYmߓwMyfwav3Ui+mSh3*#b(mDfa$IPb1:媳' $V1X-BEX=0TC)AE$V*Z 2#"0Fl!Q\TLDUK6[+=\D~)Y<Ō3ch_4_-RUY'.7IPDPA FU&&(ǙA`q0.4QEZuetͧnK`$c昆"#&&&*"{c35+VcMK܃ǶƖ:?ZT^a NCs% cݬ彰&3vÿg9P4H:dAl3yK&2c,X,0U;F W"Z3S -L 1J&NO׃* ֆm3ƈx[*G!!^4"נYgZRk:B4DafK?p7uƜ)F P~J'Fծ5XEpo-jxs=] |9ȞLjijd)_\4t>˺$ꯇ۟ʅ`)~_Ӫ-k34zL H%A6@=UVO8c7k(Y &Q?@Xՙ0{b =Ңtn=yEvҙdͲI0.p>!8t~Ἑe혇VՂ,0 h>-U))m_5%8fC{۷5IU#Y6orgVtƘ^{Bvm(GΦQ5F-~#Cu}<5 D[$pti(:9 ֑:d{)2DR݇_}~8v}Ҧ:)i_n,ZPbzc=/ů_ WOD YOj!R P9o/SGHiYvmۼZ**Խ i?YDR ]E&b ئ,Ug5eij!;N0'3SET j0U뼸bh)~pŅ ^M#:T+ETQM4Ud˱hoy4rnea\vVH\eUGHTo׍gT|bfꈏ1)0^ZzR򘉿M텈[ik4 ձW~ik行z|4lE3QݼKh%o\)l0ZRaXW S6gjGŪx*jأ SC ,[?ՒH"%G1RVDAc Qn-73U,LU 03sV7^4Ulob@ TRڀG]X;26Z^-3SSet[$ٖ~E^Jy,ƆonP٨bl ڄ}|9M6(YZ/d!'űI?W&~ Z,JE!Fk\s.jwLgtl2W=4b&'n{OΎ՟dv>!p&mu_|@27x_Yf$ʖJd,KO|F)7ICR/IP3=|zIp>{)#)e2h@qXs,)?c OлlL)Oi_2;̗tÈ:yO/I֯"}* p  b  =Ϭ$wd[o|/#1mȀ20CPXL-v1՚jt>ug#l\(U5s$E ܺՌjܵYօKd Р$V2 ~83M&/Q_(VR%C-/Xm 37鿭Sbn}nA4^ Cと) A(lE6nx( !|uk=a\96;6Rxة)m3*ͻqN5j Y?vsNE߂]8 yjdS=?T~HCbtJleU{5fc-\Wg[k1s{6|'j#1Sh/45 AdijB4?$##S4XD )-# Iif["D*s>lTw8b , cq~!m~jU KNL1}S3r0ņ[1bǞF`kL䁶 Ye\J~ (QTM#<5Moo6?ѺQSmKVWzչ4?cWj]'7h_.R:J򘾭EdET::Փ!SwݳBP=uBg|S}3IVQ,eG0b* mu{xDX%y~|~pգ#^X~^'Z`UXTswS!ލ1SIU'Yaf71Hn66c-UPKWOtڂ/kWVfX408AUDz75R]O TndR0MDTZ(Bi<@(mucFje.-!nvoi/0/bZ눋kl,טaw e7\ QϲÁL~,?mɖsVcL.W&{~Ԝfu8=gOT-qR,'V?>/w<U%TcڹEи1R"sL-c)*0]z;O7qWi3˪"@ڿ64zXNN'DSb+S60!Agl=dx:{{h B 44OUw+VvF7p$poSU5̺NM-4/ Lw'n$L/}礬n^X:BeÎqqCw\M)P+T xɈJi id((ڬ{톻i<'lxio%w /LGh4UL^@.0~YhAV%B/fdG!Cior|8f\ Fq7(iνY42I`\˨>J. 22xd'l:7=ض˅V i#ƌ'W#=2h-b 'ʑiOa`p)bݶm<;s LOۤ'l446ڒwfv= E6ZYMnRvȌ .^|^:)|"a̠:"@j1.2r=͇Wl)|92bNQמOh!qR0ɒ>b9Mic1†{m#a 5jsw-!No0=HLI0 bC׫7IުͳޯO R% 8kXh1ZB < HdVL@WhG"u&]&TĪH)REmx^))E' gnQmm)"ZCXL?N3 x"@ 3$uws֖sS2Xm_^u g$"Z'1(|S T COl:vV?}îuͫ/nod{hXاgP[Ga3@qD@uebyҎzCgC՚Go I1{d&S^}ܐR*1(1r[p.JH]kNb991BD!#`w1coo;bsJ g116z%JRr;c՝ z@c]5x"ٱlb[ib9i>|'i:;MP(Ϫji1hG! I-cQhw |046Q #Xbrp 9 A༥w3VM%Ic9=0B08jIg3"!di^ 1Cbs 6̳̐O,:di aBN,+yxd/լvZld2hQd~(%|@D T ]h0ߔޤ"I \ HF=fZ4PFDDth,-dFSŊ]5ڝ#աHΫCsXnh^ QENC3>9Vt8α!v$XHl~h@dzvRHr  P(AJI!l׮DF<B"r l=(`*+_FG8147Ű!:0&eDyf^x`,xF5Nkw!i~nlv~jؔ? ƎͅBPzLDLb.UM#e .?Y[H># J-+/"9[NDPJH!$ʅ*e%t80?PLD*ϸ~\SsmCyaW&Ţ47.,bȥ LE%0Z"k/j{d`c+XEbD%R&Y=7 ĎInuwP)y*شgeKB#6\| ZA놘n8Ę @.%c֢pjԒ49'vdvpd?,\R],{y6z-AqtbwSLr3cM j;Ȧy |IڏQRQXd1g1 JPMtmִ~K>j"JfEĎ\KU4:#:' $)_<]'OBV+J 2{;},Zf!m|5֞8q*B \ԍj|Ǔ˃juJ k|zhaciZֆk^ g:;, =a+`]2| |'BxLǁn>I} h.u,:9!0{UzuћT=q NؗX[lOBrYy6jv._Q@K,cȮ=\L:ZA&r>u 쎗"9 K3^Ѝ m?(K3UOXhQbeH~D}`%2Hyc\C I^lć}^fȋ#{Tq"U0oc/gOّ+t L~cd-n,4|WUjԔ88B|Sx~`n_Pí%7XxvFҿM7%]B3v,:YNPkVy5sASk~ѺC(-ҊKBJwJ G*%z{B}a~9p n""\'Ikp>$ DKٽܩ CjASǗɶ ϰϊ/)egCKHq/ E7| F5/JAD~g@`^s?(ߖ>EQ $K Hf-ZOpG/!u7XDp}=+`K޹'vA(~AA!de %aBfF6,hJv3pq'͆ n1[VyL8*g9u2LM2)ĕWʿンu%lRֳKna =i_`1[Ylk~&kwf~k=1˻4S82jEu3Ǭ ޻pxk"tԔ(+x" KHGx)Зn"M腊3wcΫ٘IB2IKq BQbHh{Uf<Ĭ4>e AkiDA=xgu1.]+Rz,1Q>T ^.]|H|0">Oxۆdh؛TYJaa62!5Ad$KLUP-]y,[2 v}F*) ԣԷAEx&G EUV:{@t1$\YX:f*Zz˂g!z訧䥄NHJ%׶e H`x#(ǰ8.F+/rĨv+H|gjcf!-KDC;!UHh-EuEieb4XeZ#|"asn fiС%x~5Ճ-9ACZ_[5(@2ɌP0$MqY J@h^S`R./1`;r"[WSWiL2._<@NuX\tuY5bߥVs壥@݁) TR?CnD7ƔAJpY鷢YtAY=0.1NQpE Oo4x_՚ 6 }Z2D.wW۽fZ9>jF%(ɯ(.♏_WuTLʘm.Z(/GԄaD/I?2b T(Pbb "(ﻣBiiKҿ6jh<ihɁj9, yDg_pC,>A^l5*İu aYMH^kF& `@Sq~/J4%[4C$EDW4s2>r&hՑ9Ǫj'}[Lߞ39Ĩ|{{h 8X 6\|=^k;GY46,<_kx>ڮ|+br\^Z[zw)k3Sͽ lCs%-),Ib-,m[kGy"4rR k4Ajhe XAզEY[,7NSFl ;Ut:?D22`^zVk &s9fZo9cSgu Vň[9ϗ&S5 Z_Cɟ\+ɴ'3T>s{DǯzF=l>meֵ|PҲ߮;3#H %\B`]lӍ?wA2zfT`Cc~ϸڗ ׽QVd l%ÖiםTV*+<KXW330}7-=ͨ"*x=j'WWdJZ^YuUAƟ?YheH)t|V ;H'~V>Ѡ'7o[ҘcYgL^֦6h:RZ5Y.ww+,H%p*5C c]{A0d_5J 3+ЌGoS?{CvXFU7"p0$uцUM@Y" =oQYG^4OK3X~XYvA5=ݪCkĸ¦"47N~vF{&jT16?)wBH[%x?h,RMkqWܵs՜e,uʛ'hiIVG hIǏí,EuLcmf̋|.[-R#mnAEm o m 7ϝcNX1YwCzszXc:xCH<c&8$J *[ySPO(0 1%jaVA-c@åĒՐUXMX0XX6ZS#n0Wq_|j6A,Bl 43lDB 4B1~o`mf04Zh~##e !]!Gc z0x hY[@:hMYva2uD] 3-j,W9YYB7M1$(DV,N]Nm:/ Gg70 B ?澹ّČ,nU:T6LM 3f1AS(Qv3F7 ٬d`jɂ=1> Du~kOe߫YH9ɍhnT(^.})ivG>CGZ5:Y4Wa#oBP" ߼$xo@}t0x&խ]Or *RAFշCfZKs ]4qQ&*oTcZ1خYspˬD_?Xb@ ۑ%/#_+Gu;J"kF:RҨԡ\iStXf}8X90l&L[Fq淜' zf!x=w[SbIwL:nh7BNMu~T 1?0XiɆD& P˭]}XWxݘ)~G-<$}?%&b%gw y/xY7QMYOS)AorlJ**,|Z1S竑:i\|3>Ш?[L/o(QN70-)"]:k r%ytj,N@4yL_<4eAp9ZY6jPbהAx zʔOncͶ&:Ȉ]85Da'jc܇}L5=좖Z223D@RĂZ.ᴠ^Z= "[e+-*:fvMZAN} +r#=\Y'3cG? x>"?~nWԊ@+.v!i.5iZ^hj1s2(mO_T~ڟ65OcKBth&h @ԝOMF3 tL.8wsn}AnV40o_@Q(,fpADEᔭMdT- ?0:#+_!x$XHV1$b$pE;(#SU)P,"1 ߤQ)L  AEϙoSU9->w0&X<BXSgdu)vrqxkrH]A/ۆDT)@Ti`H %Y!I)1>~y B Kkb)`>FPu#um0w DՃE@M;'cY.@bC^a֫%\˙аOX̤C2?b̆q3J4vv6lTb2c6f;iIiaj"H}Yه/Hh2c>sMna:`ImX%Z*Rڍ,cXڤPX[,TTAQd 44H9%.(lfcijfH2ފDR!:h!.`2] gјt< FiYZ߫D&l'2A2.SkTXif4Kˈdř܀)v6F8YGW ,o@f0f90f#L i/mfA4)FsGA6fwtf":nH(DZL*wbŒmZ2kN\Kw&~ jze:0 C 3ơB*lD-l% E:wӦ?f+RR00d(9rLYk022'E뺚[kam,JjPT?L4]e¿,k? W|afߺ~ǍCIXO Y<4ݷݺ!T-332t(ܿ0ޜi8şJ ՚uq \1?oR!Tߒg 7 X'wѲ T_t܆=4x̜xUPWcJӶ"#ʬ1q~K(TEdݎy˦M3Vad91FGq\P*M  %FQ#￧ S3L\52 RCd^40O,\7יִ*[(q9]PVMbmN0v頪m.2FISܜnnˑ*cimL8:- d[3#Dڎ(FMPYN1fEJ:J!rĶ2Vm6[j\!!5aޡs[*PdI6X;/Xlkv\F8Ԗ89BL 0 %-b@aۊd:`LaM C zvY4@Y8MG؞`gy!a\+δf,e{EXsz%iJTKJIFIMR Z!BQ?`@ h޴S6nztԱAm˫j9oYc!0T B$گT~B Fͱvp\f][! mbY17׽ ef{L@ՠ6+*4,yN$ʤ=|\MJ:mcq `Xs& }iFtce(s0 IVM \(#3⎑Ĉw H ܍c;S`hq7x\aO<`*}5"iLj:d&Lh|2C ٽnj"Tn1]8<>5a99uI4=Ma Ҭ\D!R+sIɘj΄,<4h E@JCҗFAΰǖa*.f{Gn$8:r5jm CH'T(b_'41I95E&W3Y7F4C4:庆r3N|xaӦJа:.MB\AFKaDy044j"`;5tIpL>س60 !O WZD>dR:WoIq& X*4ch-a֨즤6aK,RYm̚5ivGV{a^`,]Xfi$:k3ZݚN(L3Z,:;ʝC:nPvsw 4صǪ&y  aw[iYHT3Ӽ!Ȯ% uhfN *םwI;y.&J1 3"On2td*tHdb–`\@T^  `ˑx<}p̵0/m]bCoHdUTqn3NϏ[duq>yg,;Thb)># N]6n5QpiC}|v!d=֑ijM6Pmç34/N^t7Ke8ic!LfuOqU0_kkx SQNx,г MI`1 Ej`'eK٢$VN@}PL}@Yzظ2RBoey:,\B^J^KjԣnZ;t. G// C dOgśL$tzi(;O6k+9^"Èig7N4!R묝#F%A-eae4zk\zO9}bF vC %jf!s @yKS$M2HH$0îj²l@̤@1wI1$ `m3IΩYۭeaFi4x:i/LP\'\85XZ9hii814 u Bv6qp=0>+'V!-Qȶ6w(YȖ474KS3 I^5΍KWPّ/B:|rݧVA>jM y|2>GNxT[A,t5/7qj#3c/ Ɔx6}A>ä쑈zvi)}S+ t3j?{@gGSyvBFx%`%V1j!Sm KWjp=xII:- lF J@86l. v/zGH7đϽ BL$DJD^g5aocFжtHMDS!y%e(`;8Kmd8N@q*5Bvp><.qڼ۹1'e$v_Q/ru¶.r~j$ih\G4CLmS3cɐx)O}JjsU'/J7=޹VHE>5ѵg03=Rm^$wN-/!55I Nggfm_VP(xPǓz‹F­W߃[]cگPٍ `J*+*gƶZmʡp cp:wq'ˈȶ  gSvNyJbX1l6.V: ~+ͱUᐲ/;ؔzRӉE$^X B,}%qGΏ3 m QPRjU:fܵD5'֚yiQ7 K,B^ܻ7kqD7,WX3%+d8-Fddh2ӈy^ML7XsngH "yLqj̡ b}xKA@^yc'BTX);#P8/;+6ex 5y8CXD( "guZiyARA!p{ǭjݵ)!g+,Ԋ"Q$6C8_+NR2#V/+hq8!xԉ9pEܖ%3M! Xq܍I{K ,Cd3g EH&LcF]n w9FO/zd*i>Jwlm{ZylaM]BI)lRQvA*D| y*`@3xltyJ&AV࿏i rE=; Ϗl=2j23ԖΖ ww .[|1`WswrEϐ:,› =:պܽisuaLnE>owFws,Z%**M,Y(jZZf~ζGћ Ȇde}%dt;2oш/2͋fRwϹ99DŽQťrvK (Z+m`(YiCt;WpSYNvU8 TrZ-[:W!3<޺ Qbh%\ %p@Ҋ]=n3QY]8VFqP£5pVZyBw`0E ui` qh[| 7oSU86sߵ# #XF(϶c6Y*!b<`r|bB-_cg@q Z?FD*|') (qp>~X DaeEFQRN~#Wyhr8luG/鹁H!@=k>uy? *Gw%ʹMux@a/H^)zdVpj0>lVf:MDc a I'7?(78 9[#ݱ`B! p@CEl&#!n# J]`N@ 㪋]F}8C&JD\qg c[ ad#~4>om$w{+olۈ (Z A qz,m:1Wsg՞( 耤筂5aL#fN'[%ft)] :fUO;KﰆY_ f.2ܽ$4^߸(<|25j@o wP9K$+7It>ǫ6'W+Gb,zC/iu &ɥ{gT#zʍZaO}yke7fj[ +Xs'w$!Al#8p~ͫĮp]a| q+5V|ni&ӀGm vMض&wU4"6V um==ZTU C$;QWcAh۴+US,2YyyHɬtZbK%bĹ}M< !ITZGP+8fVL:fRM\v2،VO7W^(~SDzp<(@vڢ^e%.d=AeWeu}C&h%REL))+Y'*k.h þ,` R3O>R/הdvogА؈of2`ww"*ȮfY# 7Mr芨 "EqH6)c 6ݕC:^ڜ4< Y'cl TWV"aNoӡ~-}o?*~Krz2l`GYpӝluάenfD.]`l0q2yC"4bni[T1 h*ہHVܔm%U})H? #|˩F,H\2)l9a7vYO/\;Wʙ5-4HuޘVFTAT^XDvs"k:f2tޞUG*(ϡ]D^yOv 6i4ԉj֓$OQ/zzq9ic=^7{w1uLԱSl~Ͼ xB86fTOîs "3VPWd*ykXO'謹Z1!Oc]Ŵȧ٣ٟljß~{hD_m a`_#G;":0#Ҳ~{!H, 1 4Vl)Z)OٳX,54L~KA, 6'fo~?=rȠrc}<=wg,>`,@Xq 6XiJ°L< +ñ,X ^+4D,peHR*)9s:Y,,UX>7M⏓-9iLK &()q1b6^a 8 .*f>%(=~;?񭧍c6і减GU,J *CYOZn"+>1g%;K՛9M?ܢ;$Yq GZ_텉t"Y1b4B4V!!D` 44V"Gҥ?raLI"/5q|gftわ*Tr'`йCBJe ?F0єjZI>&؀,1~/Kdi%DEs7&aQ+ $۱sH)ێ3eY]%"nF[h PuA㵵|=94Tk|b蹌 Cu!W'YtL~]X! w_<ߡ*%u#Z5}HhFi#Ľ oR O_R If֮+APROzumoc8`x|N/w0JVn:v\|r}KJ谻5SVBLڪ.j~֓6tASl!!TݐGDC+ ݷ@:]ZŴ2J&E 䎴 mYj9 Vws=$ {c;#v- .t'u~Ym˟=}>dObO o+ hdCATmo4paQ>4~gM*ܟLk>p"BHM٫!}&O⟝!t!^&%~D/fH?{6A#c??)4Um@Kn" %ph#'Zwz/.n06y( ÉO0Y&DjOwy@LޮAa Sn#:a3:Hn!6~Ne4QɹO<^T'~՟h׫6©6|>YX}![fe=a\0Tfj1UFjl|n>˙ۢ `J]nAaPWjVY U_{ib#ᗲ󰹮&8Rcmh]wutyoӶ;YCT vxM7 uN[;v|]uܐu`?3X_PsC #WzX&ghz85C;Bc'?ji7Jo2=h$1 hJڕ o1-%m\Yy7>:ހ鄣.M!a/(ic z,6bA7`<\-+ לĩJÔȃa uFo ,uD#UPحO zCtRA}`/zmªbCps %"s4)5DG+@\jؘU J?BE3lJ{gܘɼ9z_uQZ|83'1bފbtn>2 OĈ5pXZDs:ߏߩ6d˜J#nʐ8L(l!#@P$bSj-uZ)V7LQxAA)Pə5jLuuԤX+'?725s0žw}Xw])[[=\|LWysflf3m[B5J!JS9)6 C,.%tj`C p30gN7 )@|tJo0ۭfmDĵ+çH)Zhr몼m?o/oˈ |StEN7mq3 }J̵{_^3}ʪi"Sn$jپ ڥs rj=/};Lgt-R0k<C6׌4,7pw O[i[ U8ö[Ӧel ۡr6ea_rC倧ޮRya65+>.B_y{s gpN-MVi;OL1;i Jp0G_h=$ q;@'h xP,[7 n{Suju#X8! q4rKC^Y1{a"HsvzayNe 9<ɨ{G: GœC !x1C:3C'u3$ n4KZR:*`>(V  0PCgL6(V? 7SļFs=3m>'r_ug0n#^uzY*)I=rçs1S*r])KnL^5, 9M=CEGXoqm ݳT܁M![(bDž;5x4Xfd<$7,2Y XA# ֮>qt– 4!lDpaQqHL(I#Z#Om>A&u4m/fo]ߔvPxs1Q;H],rKlrrjА3^Ùx\al4e.VT~)JDd,@P٪iqb,24vcH+`jYzG2`ڸcaӤgԀUy d*|f< gc_>՝\[/z-1&jSzA8Z 7+uP}05Eȴ2GXxXG&}XQ1$C !lV\a&@#ƗoRœ $pf V֑|Xs)2 c{]:\nm I $6 儕i i$b fa홪&3Zwu֧YMI3lQِHfYS

O\0E#-"8FyUq.à6j46@F S}]`XCOLɴ $Gô9 4[ ie!df$8wOC1&ӚH:{`t<8"ON;;(̾gfFթwl9EY\\X C%^)抻lĩ'ϟ8t-CXz^P7Ȋhy%B4-0p,ə!c,Ƚ04f>[-Ov49\"i*7rnMp'.q" ӄARGg$&9&m ]݌ѪTA-&wnj\B萌:4!kRa;:lpKެ̒{f%aP&q4h!a5ƺhM"9u̇jhMx_y+=cYwG1:JK 2\2d2JWYi ' Y3} Ӡ Іp5$ġm!#Z f, FȄ"87#ܪl)ss4=sypCO'zd=5%J2c4k@05nG Cw!7ܝFbxڞ`yxx′{ʞwO^)%`q7G(S)U4re@':Q=<Qj*hdQ[EmeMATVTЂOBLhz=AI}s$!8ݞ)V!;M8׍yЛ 4tb$lf=k+53 Ҷ|1+'t|BMPzrP+df1=k-*.ADBvM׌鄲S`$o:M2D}t q&,!CVk&E!VI@#R;bnS kiq =|1]άwxT75?awn!냳cs#"gZ_y;ΪRnYL['4`&WXVgt|_>9d\{` =C|0# lW :ִzާe=Xsœ Yq2?!mG!^y0\+;xs ۧNI4ScLw0=0tJa;gMgOOzCE<ꏒ"m@KXDJF >B d.zM K;l;aR Nd:FTn:OCĜHT=ZJ!+iᤷnCF5=l,I5H}־∣t0a&N"u o01n = X3Fwd8!a_ X X#awo.Ġ9 3aGy񸵈7yS eřaNi A(N}Y|ȇP%;ɘh> D" Rb^6dRLaչ}:x6<6+AUyMT)d !뗾kuE@H7{֋-v?gel`cHDm`D'Hlr|4^F:~Ҍ1. 2 2sP(H? Le!gcK'җf.mԦQ8 CMS2}g~ t"3ngq` Q&1b⃭GmyD45a #s"3֎ѣCeΫ?i:\y 9w{@Fn[ECI h|tȋ2=_trDGG9SOSěM2`i 0x38(]rň< U+^I'0ИIsܔ@)B DPpr Qs{h6ި^~XG Q1ĭKvq*b 1 <# <ǫQa T9O5Nn1c\kUm?%(fIG"&4[>\&f%H).㑾 } Zd PTɻ%^(Պ/Z:]}Z̢nKL2jf"av]20x} Ţ$[$%6j&Fj^<+D`9<6}ͺ&[ tn4>_"N :Blڌzlq*Yb?DFǂR'?ED Bx_SsQj-EG(DpQh8#歴{fL4aPӺr?=1%;vpk(1 )W J3G2 >kŜłyoqϐ1Z($`r!{W8"'L;8$HVjũv(t_G1]9C lqNC޼ISYCKGel8}+^Swa:퓦k {A| [vk ,ܐaK̻ z[ zsg4B1x"] >]-Ar{A'ֹ~T3K0_ZVUT,[YQ@eY)AQ^놋W8#GGW`S{B|d0V!TVáq:a3#o|,OȯW:hsmk.4=aCΪh6Xc|3]".ЮU-%Z9'Cp`H j= U $ϿR$-@rňLo~1'P<5^ Ԍ29 "'E":m҅fp_~Q\1doV9En,lΈzifg QN<+s7U6tPCI6.` u=,͡{ S\S#b_ :!F_4ӼJw*<Q (CV#ᅔj Fy~;U|?O;s,>n~?v@XOUCBQ 0<ٛqR/qM(/S6F ƒ1>5h!gS ScU$(p\x9v\|b80\i!$؃Owt2kI2OY$,.Kamoa*&6  K3017]`pgE*++!?lɑ^$ 9`MGֺrLvIW͌B& ^%WDDe|!@ hB+"aB(/H\!:K Pix<٩4 4w{ea3z2ٝndɆ3oU(U1Whk֋E!~_n٣ńJh93Nˆ 0 $uT#$=R] K*5IAD>J4cbz0p`3ݥm؁ z~;o8(Ur`P`̷{ p QILIRW~s9yۭӉ/]27L4ayIwiL,4҆kM!6'k3XvK-n_OK:ClcAeSja,Q4֕:/KN,0OIq:7["Ӭ>^zw [C4VY%rubYUO~svTͲ;?D |>=d_5Mݽ5 MW庰j4I:jOR9ELe_\$g' B/v57- 4A$tgn_ϼnV3 ÔÉZU5WχKhCziڒ03j15}yTKFicӡ 'HO1\dT) f~e~'5PTb1UU$e5,H!Z6aC>LpGYw=5A pɩ}s͗d1k (^a;̤ƄM=Zfdۭpv6zZWEZ|V jJחa ؋1~a]hyah|aVXX0QZYdJBI DQU%20y]$P$2,F~3対y7e/%wmXRi`@a!R$*Ej$!&f(&b%^`!UT40iLLdGea:O߼r: Pkˆ4h0_5 md%t:pWCA|szOMb!+;Eq0!1+Vb}!@<SWs8to<"1rOؚe6/g |$Ab'in0cDu\1.SYqf-(TS30.$7t?tdX+C2,Q$ԨbT鱠HaݒFF,Iݦq#Ͼ8Pѱx&2֒Qm(fbk34 @iB$ &外ڒPHb~O}JVΑZ T_Z6]r.ӪRdY:<CBUm5HbL/vVJ`xsZ4I{aarNhv%Mj pr ;x7ciֵ&2ijb@x5vd:X'Qdu}N+^&1"YTScrir"|q0L[a%0p6N1"omp_ Ճ[YI2]Pc Ru{`u ( ZaDr$[EAT-M"} H_+GC/}}P؊CPn^ M>ls(g\_c`PDw9祷IOq,y< Rї0zt)5AZҁupͰ""nZ#KgީL>[6>:OV?`b#1+02G7tN>!"}i2V9;bS_Vb'ܒ}љAnJ%a7('a'gy|5ү{`l-WfLJRx3@BLo8 *3v2$"~/ŰE@7LҢ#LG tE:a~N qDfYPOP!rEEAC`Lp_[(ho7Z"z,VcƟKoQX2!}B'I¢蠽Sr01@N$p[E423-{+A$X6M+2S$!5ؚ@:#^j 31#=hVO GA2vYWeyi[!#SCEw<1.ZaRҥkѫn9R/ռ3ZO8yֶs0&FNZ #矿VجvDATy$a9~(hd?}ˎJSHn TaCҷCYZ)B ꑉO`V,0^XWt+ aKGEO ԩ)T6m,s3M?^ "n4R75MS$Xb?P{M9&s2)i>yNt4/vM@=b90sI33}+Ng36DX@udz1C$@h,f!nŽ٣).MZZ5,y0i ʥYXm ZpְPsx"f˲2vVq҈fh3T1L3DrMm]e]MZJ њw{D: ɵ)dj$IR*幃U=23bjÂl0*4[E)oYv0٫IĥSv8ܛ޲7tv(Af QE-TVf$*Y&zI޹]6:UZ<nr- !0uٴoNCoB1jڪf ӽ{9ap,sNJOԣ 8 l¡vy*_ EXբqՕem;˜riK2 Xۻ4TgA{m$$5Q݉Sis3S P@-,Bp: t)"^GZKbi\SS7UdL H;Yb *{;p]%/퇇 laCo=iwj ^LY%TTCX~؄'^;(CRң]L A @y6:dΩ Ri!8q C[y8ɾyGFZΚQRb:KLhFZbAԯM3!_T Os #E0^3u2Xsdm'y"}|7;@CxYXRV +;^ DOly fZ]fBP Mot OiَFmBl`[A鬱/Cp+^+|f\{k,fFn+]PN `24k=+q 䡺F|IA|^y9s: j$Θ眒a;|i '[,h,1<$תqgIq80&$s2cfICdgUHJ1i/f-d.143HBGFo5 ! y|s<Fn "!耞2HOX0RDb f{k$xz?[zX0B| O]:C80hOkUb\0s)~|'6%ӽJ8yh>3 *2hO$Z$6d#dۯC1F''u?Yb(b%^ PS9>(48tY{9\Cs{ +i!ud/;|p0f3mٚ;~폊;&sȅ BȧtՀ=&>Wz=j>{1Ǡ>p˩u'ƺ-Ș mg|ϯ/i,C50~uQ}]|c5>nUMUpab5jkI~meJfҡ2 _١)5jv&ri]ve&4ڠBD\CSFzf;!D<BzF3G) +#[DyTG^VjQtqcӃxvOŭaStJ/$G(n_TXi?dLU8x N4Lɀ_=h;25d~܈»@EJ<.jdNdM۹%K외@N(;糕L;ReC;`h|K5{gέRg̈́8E]*>*DP&G x19媵"'@XgTH$}É۹pA@)wh襁D6k57,`ȳ|³"ד,>fT?l:Iic-y혒)̨f5'!-LrbGH'\WD%I^+=#)z$.m& +'ic@eZd/(ᚽwRW/NbW%ATY3o Pr$  ?$`KE<;pW< b V)C{dEnes`ۉ.lJ(H_.mL2(#:6YӂL"pB0z9 IaҨ".Q8-V}gs,7)C](mDH &H)aŌN;#a&o} @I^Qe\C*~Gt6RہfiF<*R H |s2h>yyP<0ZP *,(9 čpjV)6/Bu$+w?wfn)柌T{.ƶԟc_ݡd-h_X8tg2?:b5,1`n@?c_Be} >rk?> B (˥_mKW{ևPeڍڹ~h݆JZ=]̣b;ׄ?9לI̬FqAe|`yMI"N6i$p ` rߺ<-ŧ-힄ě58P`T  «8 "‚d-(bN`붂zy*L_Sk̄|?8r:zNtNxudվ 8aQL3Te\>dbἾg~~Y&E&`\XJD1U$Sdy) srI_/aߔ`p묨VC2n6hu>׬ב̱hw@֍ &8e-puVa~{͊nS9rQ1_{hjukIl\0~7?}:AzL-? ! Kgr@KD+@Sp9`AS.C^p;u5YM4'~W&yuGj "> >7A-bmexQ4akÍ? Ve B Шѫ[d 'Z뙴<.#єgԯNF}&PTβE%h; ~> lyZЯ_,﷘Tc'2l-shVތ 8[Ex);z9-:kF0řs%4UTR~>z@E ieG~ނ#aMegru7e}x uwQ@FJU Dvq+,6:鑲#~HUGP$^kֆbGcP+E>MY0E |Y/p4`>˓#:ã kߗבRM%ɤGswOrLO?};e42+S1*VOqWP*AmPeaκM3H,Hv@U2r]!Y!T4Ht^i6VuH(M]w1C0L4dL6k#M[CPwQCORf:Џ/oӂʪ,^6Ur VV FSi|y$<z;X ƑaffY3̆2i;q1XsS+=8!zbl.d;'t4`GG ~R$ri!=/XgwNሁݚa`Xi@\2+H`;Vg_tz wCOD)@(M07m$+rN)t"y] &䝤 /Xwqmֱbo&.ӽXbMkTuJ" -(kMLd.zZRgYI\Yi4^F3z|k2@מB4 r5B8T(d6iql.5sf*i,\;s{כr&2ydXzMID``.2Ì Hx|9h_VDaG3^5!X3Ʊ8]{gLNs2@mb[n m[1&) J 'SkBs]䘛LbTqT\4,+K {rCٶH؄u;v jwN,K ,4.jp|_9#~wE,¿P-#-hxScK'ɔ UÀ!]ѺIgPƊb3ꅜia@3}zQOqbܢ8njH/ViȤLa:O ֩x죦uCГlR8a/p8(q@B]`gu'Lr? VB[ćZ§]klE]|q`VJH% >1Sèj LFFV\]bӼA䮽2(B$8^L'𓷂v_K2Oi$8YS-PquɄh- 5=~PE=1zmi$I,.9!؛dSqONX=BjF k \Ѭ9>VL H_9n0JMw'*|=('qغ ۬N2ulPݰԌ>JۯC߻ N$(JIoƼ!HYo-9B'b=M4'XuK?::-QwCy*14f!4Lޤ' l#t"% %v>Us2_ 1Sa OJCR6Єa,̃ G04Z8c@IZ=M^󞻧8{ \^#nO#,O$/ ]71d!'QLFk1-r#B)]5#'+qr4҆z=1㭟 J'I2\I׾#0Oq0׌ f!b6aA:Ѻ ЇL}eՁUvW '}urq'}PR +ib;8[f0WtМAK P i˻:5za]i([iu%*6smj"!)ee;l;`Py-:ݓ{l"Eack(iJd!Oi g_n ),[eZkn]mLO^LϨ5`_Y>z q<${F{ {Ik;9BT1gD'{cm γJ7qH vE(: UEyMH&7<Ähg2iMj[e xa+=w-J9;z_T<&2ᴓyɬ(yޏ\s>DD.ve[-v@2њ=ưv'aX⎐z*@;Y0ho.9/-U Ч5(co"k&%W5GA@99ց^A~: }qj.*~Ң``UGQVt(!^GzW>Nn\&eyԓ(}R='=lxhb=\Ѹǽ@a ,Bci`JTt&][RlDvþ;jYlW9={|CdYiVp"$~^c aMPB(~HI[q̹YBnh;ړs 4]$G8aD(F$[R5U|Q7o[5Df^6rs.@Q4kx6.gaAFm WēvX2l~<1P.n*\ѵ(ϊЬ߷vxD\Vbu9@}SR蓅éq/bDXD0gކf2M8n3{1hbT g&@C [Q 2-`Ib_X8 f:YΪaaft7[u)M(Zۏ Ȑc Ͼu{K^Mp2!С᰹q:pe~z;51[57 mkakDk UҎ*RV< f <5\$ &f&OpQ.* (ᚨ:C'˪ ޗYV̰dD+7u!g$wWXz <.=xoeG3^]e!!J1D53=O^]hf ޸Poq&Ntgx=PԭY)̮0zY@)D=!Abl4ZpLCh Z=hJ*Ԗ0L,ᨲyx%9B OD6<[;Aw]Peb`A(bD*v@XZXsi6aEM̗'mI d(oC!Nk$XMEZZ`}jl#X tuǍҰ|+ARaxҸ O+/}T-{Y 6mڰ$Qf-э"`IjQ/KM% l4 +> X!wJUHХUgCVp34N 1WwEЃ&e1 ]v|1wָ`Wa|Hc #xAFJpAT2Ie0B _QYu{1̫S%$0Ɋ/D;,xo~߼ ls#rqacY[oM)Hôb0>Mpl '8rr.EŽ%+G98K7v놥 uĠ)T踓Ǐȸu#d4QT0:뱜6Kn .e-UgKذb0)T>#S"(}Guv~ξ\3מO 7L㹫7̊@G =L#TvKNd`= -Pa,&(UoM]swj̣1 BDW+H35ۗ-$4 Cpv/wxFT&.ү[b'jF$&_3Xjȿ jD˳06GCծ5.= GR=+Pq&ps#rٴ1#9ݥN(ǮșQ!R,WJ+(T(y”-4CJ \h)x6mv]>QYXvOm:bc~;{ u$yJkE ,;B/Z^~RLĎrSrp򦌘ͤc :2o nNܠ/t3NI5Tgx4͉Bთ_t811hfkb U=hQ/xj0>/##^|G7: inn5g?[cH2VK{rѹuYvIozjvNP:P'޲y̯ |x ͌i'::?9D5)?s/x+Heneb Xq-E!%O+w=`g.x/f_GqI~&87FOgyt@ [(pa@%2̘陮3*jl #=Q`vDMp.GBym $mS #4b9Mn`bux EXR1_9_bQ4쳸wY̬,0 @ڴd2Cr\he>R1Y}ZSbX BC)5Vg:φ7unNF hWshNz|Ne;%p8R揶 *YMchIapbh n~>[/.J\SziցQ + ‹m ?2X\؛j1ոY66@Xb4'4􉻲Ck"7GI޴yც4GX~rqdGԨ bh4q* B9b4JiԀ )ܐB9rl<8Պe8sf Ѡ2{fa ed( f!j Dgr"9IX]u !d@nQ e 4i Dqī] T Nti(f.j wC TLTDܹt Zvvh~Ў1!`7s_}-ÌcC~ I7ןգ*_ơϴֲlLjQ|;:-&mmά4[.1OD; 3'垙n1z+C8' Lhɥb0dg^֘hw^q56)~)kv@?~S;gCRѶێwm&5m*CYBk(Uٺ9M#PY_:FQl <&)>1:>~'+'$2"UXVtjC&gh 0TQV}R B 5\OHŰDml R d`yݿά}S_Ƃ `o=dC6)%Vi:8SFx:ҩ!%@#9\w1O )AH).XcCMf%q6g؋ #??wh?,JRt`#O\ЋpVWۗe'݋,$4HTBxH( F00T#c7'{> Mar_ÎboD,@mJ܏B],W6F'տOÈT *LySoV"^hϿ~:%uѨlb3Xp!S6DDВkGdhi$/}"l/_kn#"Rɠ=D!臿cH"]~N ?zprddgW_oCTS 7IӦLq'pO7/<]^v̰u %o옙kTI GzRI#!tzĹǻR?w BOV'e/:҂6beߗRUST$d1 MM58;$f{}J`,XQKY3[vz' k;IPۏ'h4'f{\˽ <3OI)Q h K =3S˦l}D9}=DR܇·I鴱 =rx%tbZރ7a ]:p2mY _ڪa E"n5I1~,t3['>csK lJbSҤTvİ}#Hg= Nb wzpS*`}o*ݹq QNf$v,޾uö fWy1Hm!K%* 2  ms4 Gk4͉ۆ!1F:ր!MͰދ}Q]cCS0Pt?0Lf[;'7s.4k)oT:KX6UY$X5[߾tHy&Rm/v2rkHQ,=<@60Y8nޭ m9:f>vT{U(R$ڧ|!%Lh:j\Eƫ > j͈ş;]oRթ 3N.z$>B"d~DrwԲ) Cˬ372iV2ڻBF.CuHP3#˲ƌťq(@&Fpa`02l:Bd[onc*E)ͦopK]7ZʅU $2[*Khj.YTwF魳YI&06Ӧ)Rj"KH@DU]gh;G,{ U932$^4`ri[ I]Z_:a'QU6FܷAE0Rah=Tn"PѨ[KkMcWg972)1>HX5>ZE!< е^k!U25<e}jæX06GE> n=/Ǯ}rxXLBZ`` t偋>Zm8U&2{f{Me ^Lݏ$9[//=1=XI3g MOhhiB uhd%8`mXxyg, HhkMS<%Q$ũ7@'p1e #~:Em )y8Lx@vz3C$  )ƜpP1s zɋ6aͪK ;CG-nEyzq y舐@+giT79̈vViCRBqZI!b=X5@a?$lV4IZq ā4MVhT~2;R6Յ򙭧T׷sO`dɑQf!K)Rg_Sjt+$f΃o Uux 9G56OCG2i2^@;\oIM<9(GBٺ qmjSAԇx5oky$,`7R {BjP6RB$4Za-x' tdc'hzoon*Kj8?ӏ9N^sw,xoVf)/HcIJy/$+7Zf(ys]́B˷D6d:Sd691$%$p`d瓙=kWCL]õ<.4_Q[";@V=)Бuqhx\ҝ,QP_wLMQ_@#<熗}^Azzv:ݝ1/Y낅wI >>pkCjҧN@WwF.$&ؖZȆͨDR7UK_Dn577*p> 4=Y .0ؚnXL"4o1a*I.= LP6UzҺMy uKJ[$2W 'S꜍UK\^t7;Ӿ~מF  fAAH4å,=e[Xd=x*Smj3~z=PIvI0TXۄUKjTN=(ni FkYc!}ު ޡSw1zv}c1h:/ 2|v@u^ر@FփG Fx]0ͽMwdL@W,`.00Eh_tuч?y,3$#JhB S6[]FV?fQf;CŊ!+L4*OAlof^*@!!jH-`d%,Jl`P83[n U1T?A)Ү"UGܸ{_ʎ)9G:>&XҴF6`,]+ >CؗhŠ#NʶlK;)tҚcZucEaChN_{PvɛU!(Y'>&f0yJjJvwW{]@GLoyЀv6635v>@]9dftt+D?nhm%9rِm.>KQQ(dگR@!Y}G!@rzf]t~s'<_;+M{`O}.igTcnj˥^>Xx-)+i[6ۨHdQlzbFYHljV8ta6laih"Y8d< Vr <1|l#v6 ZG$!P G !]iWى=ܣij]6s:|"C /҂2[Ş TNc,>Əţ> p"N@7)i5IT|vAxp|oA_ctWI޲1~ ^HXG&VO5\.M{ 8I M+@Z=-~@ŪJљ|o#gpgHj]ݨpavկwUtѪIۈb t{݅ b{޼2 cAdb6:.]`PKMֳ!v 7Q*%!njsn@\3Oƴs!|" ﭪe`.>w[Z.0@$k~&y5o*SY!fZ􌽼+WFrnX ppJ>nؐ'V1̾b[UZKuuz R~K:мlW5P;*Nl#(3 {d\hDot}_A9fوڵ NM[6h_!`*8`@&U}&$E_a3gN(ZCnhZȚmAȪ4K"0'SK*\_|\9j > c_5JL б)PXȋ}g^F@L-,fmd׈J.gdC%Fإ2ܘ#/w< H T<fBt@BEy, Ct02zYLZCG:bYjpʨ.==q(钂Gߩ]}#YD~uOy#:V37F䮝d=i|6~AǷQ'bYK#fz7TX >Oc.ﮋXB_K"0w7z6C6A_{w8,c!O2>,al׾xN^^gΡ`%ѡ {A/0Ҿ#jzTд? K%5>:>ZfϿQ28oJxzZ`%9'݊UFviZAʣqbn~pL V|'RBwd)otRĊ< LMH!%VۡG-@-[Rρw O >VP$XH47F6^ i?LӼ ?ǛVuOm%e9>@Z@ }~Xk* "%MG-R/3[+6xogMJo'Od_ְ_߁hHF _[| Ā^.ɠC )$ځG7ύM$&BNy14?22My='77 .2mla:!+ XO}4b@a$!]2%rc!?Ձm lhheEM~vrh]P ucSM ("Jq| ??0HZT2 1*TMHaeCS|8I! MD"3@[)_0DFa ݁GN9{V/_;~l0C [s?#aPR~s$1hU>o<7Uơ rDbU#PX)*G‹_>1]Lxkwn5N s=TᙍI8 TЅI( X1rIZU8a5/:jH1_  `T"wa 8 Hcz|W`&$E=R#.A`#DCTiщVsRT}l}zT䆆?Qcru,?a ԓF$_*P-񜝎{Yu?xӂR$e&VѶҏ}3(> 鑀2 4&hjZ>\ruuT?"YM.I_L -3TS] I&у6k$PMO܃ӖB죄CVZ/?|EmڵǢ`~uX`), 'm`{3$0zAϫRX2. Bَ[lJb, S-SZ֐,S ^չ aSX- EJ0>0)@`iH|!Ƨk2ռfek,# y@VLh<3T1&Q59oԯ,1^)D6 D$FqQu\t%SHZ4&>4 29k+m #6o[Ч-EKǧKjյ4b'V pX)>=#$q@6d40TFKrZ kEcu:gqz]6p]_o MO$y E/o/ZcY9}*k%{2{2_chAUxj}aldJ4nu*Y;jAL%TwcZx-QAZ.^@ D!4;n~j`1KTB(♖y،~3y+c*7P\ WKȽjY.-+{8Av 韟 {GqK8Y,MJssF2?hvdIE, @S }j ?*Ҩo0kKՎN/Ht==}z>gmgW!N Ad2w_ml+=;v+/gCIߛ'hrW:xr nj^0.1C:̙`bcM U'2yScM<LjYj3 G#~zc[aBccUɋ N :e/{s{cĝ:y&G[tXsTXyaY*TdX=P.^3-"Y#LQlLTёhqD<0W:d,'mCi=[ch<$zDo ukvC:Zh&#%㍴9XKmXCJިAɏ ˦C< BZIm!t)^th^dk{`d;+BN1Cw[b GiGP)̠xxG|v h&J()i+IAUE$KUUCATIDHU @R*5T QE4S  AbN}ިhҩ]Vإ-5 *)lCM M F4DYSgLJ ٮnQN׀8phQ!6xmi{8iך{\mK:`Q1epŁn=͕L&Z-[ǒJr5Bifoz坌S%jV>Úٗw2_Po/Hˉc3l3̺YpBoVs-nZ^) *^+/=ï O2].TӃ}T_FF76X/lPʝlE’g/P kFIx>i!.+V-ҷwnʋ 4fЅZ$/(hlbtꬻwZA'p,܈]]#y|+[au5HNpy0#+鶙dB;,aKO lAū;m2|ܤE4C)Tc$`2!m4aN%>W*Z=y֛Z(2`᳢^ Ea NU J|]H6jAD"T6ܷv;h;! ida2jsWOQldXQ33W̶c/ deܛF31LbH4́HZ6~vG)+]n&D$ ΠL"A B2퉮r HP%KE,D(h0]l iu5Vd]9Ư$(Z{!ޕHm5H1GR*BVߕ.E>2dq#=MɲQB-:JA)`ď Hlp[Ϋy:*!ahP{P]Zj!Zh!N \ 81(! b>HB;6k =s5LHf:uӧ$hBT`)_T01T 2KcBiC .[%2z58aב6 |.ufzZb.0p i7 JW-9=X:NRj@m $$aϛIl@AxtPXc5;1І:/Lѵ^ޑT #* )%yuwC2X&uXķHcAKm`M85n9*a@Jr='$]4L`Ǒ yHZbmxe 9K8?bK.Wch bh)r73yv_Su9Q)=yt`5897 Rي +)=qlqʛ]m3֊BgPS0Zv526TbSs1vk!L9dE 5nHZvn#W7o 'c֞1nLuZFX4.ʪ\!#;29`D^+Wۛ}\*I·>L/#C2V&#{2C4V[3oͥ`Me*՗StAqFK\n]vzQƕ!Hv< 9XCރ౰MB(mReZw^y][0YGa 8w.9e:{ R( gaPR<")ۻÝo 6.t%ӍA;D;«Ƀᗕu2W+!zzaf`{e`y)<ݩT8} ]CC{y+=]y@u8xF6-)qlݵ!7zܠYך`Rx⺰kڒ}^( /޿g+7Plﭾ]>ʱv, 70=Šk; 6#;vQ|j+8 2V1Al`ۻh6|ѻZ}Bm.OE.4(xeH1E²WuԥGF kkǚq_%^ǡkx'g;g_kO'_Ootyw{iozoo_?_Y~'F t~/c~~d5^Nz}?p~+0{j}? ?W~I9|/}7h=?}}gvOS^~}.>7?W1#K(7xaωnϿ?>d{X3ve}~%~D~,|? '?};?i/G__/r}02z߃u|S/?{߿:>߷~[>ߟ+?aS?}{:?C~>~}~rb|,)}iFD~W=5ar7~|~|__/w/{k|&?=M/#ok~O06>߃8?LI~}C`o>k뾯l^kuco3xzW<|~l'c>r}n~-A? ɵU7_R=˷}w>;?_]|z=Va#Ax$~?z}k̽_{\=D> >ǫ2ξ󟃞|o|>=M'}'O}߰=?oi~s7|?/\={[cY9~OW{ץ'uwAf~ Ozg_ |Ǟ!{"{פ׳~l_>WoxC7Oϸoe)==^??7s>}Ci/~=_g7cv<CzC(t~n{|{vi=?7?˟Y}%{/>>b>}~7adF|&='c~o7{؏ r_|f!}?_'>ݽ>|?|C>t?3|>=oW3?޻_o>t>~v>cw 3R@B O ӻ1 Uj2|(9"SýV,o=VѮhq#g)^E:+j":3L nuƒʛJU80 */GBA@pW]kb$:-]UA W٢ aClci3] (h|oS]_"ֵدaì$C4n" 7kccpE2]ߜ*UJJaTAUYAu/QdQTAFUV,~טj8{G ]_fHp$d`>B+iT3UJd1B$cjmx8jJBH(:\ֹp']4@30޵uaaͥ8j^y3"Yӆ 4 K6Á=~gqś6)jrgH|&YQ!evڒfj҇yC 6n0ȬI*qi 0x E*go_D !S4Ah gCVNU*76>0 X%`eU h\"Rj*ܖQJiiMHga0qxiFf\-'$ѕJ(e#NQaڠU7 usLu@q2A_ /g曋n÷ fS=:td'W5h}'B$U_T w d}YX[xhXY ?aɼŊ;i;tFײ0UC]y%J!6BXvSBZVQPH!6 2+sչC%X]ee# ̲2o I04 DVj:ݙZ~" FA"{u:,NHAQTuLiM,Kɜ!czjS;ŤK}Lט!/ԣ: #v>"I6H16\%3Ŭd0v⅐J|I*H)ug9)Q03OjVL;28!>L٠C]wB *i].8U w<{о{<ڟ}igժ.uqAIG~K|MD{ucBOK/hcɿ`&o'xJ%=nmD}ce8C~sŵlA}XGCG|X`hˆ%e}61YۏGi)j=9~Ծ{e{ KO˷749K}smi_]hzqCRQ@1P==7RGd??G͊2Jk?[j-s}y#~3IjRpP'/& '>p޴^O H?J׻CMxyk}x`C?4%~|@?*+i|s<>Z߱=;i^5=WO:^v?&\_ǯb/g9Y(|]~4?GCzp6 "3~ݶY~4o~ 6QA0??&1PH'? ^#"JR(h0PYm<Vt_e/vnJVt4ތ}KeUwՋkI}g:^hoaf e[-UQM9;zg:3{YBnU7M-Tfg:ǜV)dyO s1]uۗHXWC0z,"UαcZ4#DY$Eb7Gu%VHWgD[& 8f ʲdcN0'x;tIVĪB͗g=I!D"uT 2(6ᱚ vӊ;ih P!^kɃE@%)D THP:{80 L VDüM#˩pNZ7^Lد+ P.TC+6kH]B] E{ۘNX;ԱXGʫaFx#/GkLDL+aaM.%dƳ0.18Sn]p[&PTR0D)X*6\% Qa6diM뻯keʠ0a`tovVs<齞b Hh^SLFmn=4!ayUd^5(kjuy]fJҌDbo8Ŏ5硢jmNq7tL͍:٬(W)R,pA{XºxPt VVқ铞k|m |>ixEss*$h1<%55-df\zc3Jy}v!yxlݳ3nPCqdr!Rޞ)$F%^eUͭ>cyWs)o,ȱe–ft\AF &bQ)]17R˘$6k&`HpX9@j*ąLAj,J<) 1fP"4ɆDʹ2whҢ Evz1l=>אu=TP3<`ucNNhH)"^|ۂ\4J]9߸^RaV `,3..=]veKd.1@ҾnRrJӮfԖÄsU{Ⱦ"H]TAds4kZ8aힸtQlnX*g,Y3)oj#ބuG ^YLzeמAnmh^ Ӥ2 mp]XpU*" 32%Sûv;aNt0mnefb*(ヘg:h%FAċ&˻DpS⊅l5OEc%.b 89qWY5H-iA:M.D1mR褀 d=+SNAzްȏ|kBb%H 1 +ݝ{UG M_ux@3/բ xOq ӿVV<3ctɁ60aZ P}#hbF/u^.=jlݫd-չ2z6-೅j$*1*Y:^!racl@J;̎cik̦c'LlT;Of<rkte*oAOX|xqU% _X`!r&RKAX!-kȔ[z55PAۉTqrhTNzQ!W oyW(xvtu]4.XbkXc3$iQ4Q5AݦjBl*GmQc9ӗ+@Ƃ 0Gibx{r١GBkx}Wi@v%i6zt, L[-f{ >!}RB8%e^K wfg`7ꜺqU$M, CWmR#E)E%,M70tQTh@zɩ @6M"`-xo.ҭrey0 ?P%O2 rg^MjS!ZFsfUgBlRPxt;'fAUE40TTm-'$D£nf2WI[CgB{m3S+XGkgJZ-c4i$I SYiMaL!hZٮaq/75,k 4H8B# 5T6(5t2h(k!hNM.]eff$R4F0|/׌wHt8 ~~'0˻db$*HHU\H\6 Pq E8Ȱf% lqxG@,؉= .j;p8<2P@@ڊM$;zօ} 1"*ʩHtrԽ0笚THԼr v9S*4_nbf^f]Dk00[m4"TM A[+ pSjAx,2[V=n^45l& EImuLus j(8^dך.鑑溘Aڣ۱>DzY[5,ÝW|u:#t cL YC׽mxZp5,GB@¡6!$aĉ1 U5r45Њ]Pil˪J.]3IpKa63WQ HRJaFP E[,(!Uêx 62VLh9'x e^uwh`']U;C]ܰgtWlõ]y .˱u6ݷ9#d}Ar~u)겙P7jop0&x*+v*IjCkJ7Vev8=k;-R1Kw{ϊ3,vZKxdb7>{hw;Ɛ;n^kzͽtw!wsX+JD4j*M\WFc/ 뾣6\N%~7*5lK۠*ڔ(+j 4WZ˱Lصpuxu͇ju^<ѶDjxEm^ ݻӶSk%"z1Cp\t8i.*w}YqCNft@Q>0"`Mkĺ-*隴i S2*^$<wۘ=uklڽ؞c];wX>Yvu!J )# o'K"/ZoAqkNu]2g VVufw`Nz^I7H˦.T[@\$BX).MXcs 2P&Z4*b幧% 12(jdaq0F5p"*N67Y0 H!Cv)Ks3Vd8$jUЂUnʨbV(յbNoPPBΤzQރGc$WRO;6oV+5w{2Rjl>7&:,'ok4-g+s,^ K64mkQYfVڴQLNnAC}ݔwY#+DG_W&ݮJbǐ|Ubi` R=~|vܫnp< ~ lKXd[[4$eX )M*A dLqQB5|}(Kpclh>?L̑ JY9:΋,7*`ˢ 0O^˳݇Wa؁0+kY4?rh+xoK_z<=LU?Dip{z5 HO??=RʟУ?"M$u5Nc"ZLrHATIHt#re/°rN"KgU7 8/Hi#ChT c+ N dU(79)M@KC $i' ﶩ nNǼ'U]ӌCE}"{g0/n4L'g3 %4Bc|WGvi֝>brj|%_~7 W͞~Nā?3\a5fc1h/J%z{D)?Hщ{~(*|6~_y|=O6?G,(q_~=x'?=j4@p{Ø$ 寎h.a)7† mDHX#^Y #ƺONDmxӂۼ^^&gd-0`d, +Gh~ׅ_ cw kƒ c4~M_OW~oko\gמ>U[( |I^yGLth? %d~?h}! RC1?'?C?e?C"=N"na>?QcG!Fe/x/}1TG>{ 9ENO̯Ϗ-6s2>G-&SQ1j?qK'?SGu2JASXr-׏BqЅpc k40cĒҴqkGec'T*C^ö۰>).#u`5ۈ8Z\,.;>@YFZ0>@J743[d;sLG^-:ΨĮ R{}S;whn=o+,hVET` ԄЁ"l7y!uPYj%M<.BfwVIS.EL4 D,k%jfsXHtԫxIԡ2K#oI:xaw¹a% >T]Dڈ~(8G)NP|%LAY:W?Q mֈ*CbeX(A{N2+pb GD&ɢ-QH@,稄*PZvk[Ry) ;b46q#A@-j&"4n7Ϊ]&R*L. wKK*oTêMbm:+Z#*A Q?/G=w:?2osIX)?g?ç=GU_aɑDҊWǯZIp Y>O~{;n?_|='O=G/v]^֞nrGdy'aNF<{|?`^C`a򰟚>fhM#x Ѥ&h!5?c}A|~HD6}LaZg>?yR-ZR ),&1x c??GG_"/[lO> 8~pug韱~eyChbojf 3~Dߠ?_'?Ư{'0pomlXk6 2U'bȈp 4lQ.W?{:^}^[shrHeL3؞>ooboߪ[,[hܔo*^RKҹ_gE`t뾬 |j}$[v87i[jXC{ .ws3mNv So8{-*"NSx;yeU5qX@JgnsזjyݓM5L*NTB{F׮U:co(U]`_6DN۫8 :[+)?e}O?+?PsrDR]/_}/i o\? G"kY WyA̡ uɁh`i٧ /R# U536GK~s?xrA]= i8'>_Ϻo!+ 9܅b~*#S5Hb eW_ҹo'K>?_aLCh" k?m>Y&KG>ȣG ߱K)NI̢_nɨP₝EnQn-&C!n fkAcȰlJovbTc.3~i=g@y?𱇩ۧP¢|XgE=aJSEST@B]09O#;ynuS5L{{,xe։Ԧ(o2LyYN0?h `|}˖'̿w,5Bh:pW|~>H[PT "|ACAa̳OYraFaO$0I}A>З2чjz>&6G̐鿁” {Dɔs_,}`= d ڤ7ҫy`4#|}9{eCClGTs$&C}W=~_xX?]7}C~IdO{^w?e??ƾ&~x>oc/_ظ5 W0 *~?yi8#?G簽7~?əEf<_~csz7}oSs# ot$}mPSK^jd$Jruכ iy==ǫ^u /D d@}}ٻx"x2 d4bh_`lYN}ľ?o=Uri~q־r|UR|E#P+X\+ *!*j<'.Ado<Z𑞔V??OG!Û/ȩ6x{hwWhVz>tP#(JM=cp$V+.ӧVd(bKNsAv39Oz$T<8P[Y\jZ oc]C==A={%(TggW!)՚jo&930=q_` ^Z^Hju`ZC#ް3A6Fp p'4Ct:uPh@E 4*W76RJeGtrdB? 8uhY]4QP/]x eg Wເmq ְjDZhWts=ϵ#FU_ꦿ]`0`{lt樲Xv&R{|G\cb 1vςP[ޖfV omlJ[̪ |G4a63&g&t*{mCb)܁a{Fl%  ܘ% "-yۡ߯s #@1ݔ1:Ĕ: C81ݮ#.81k㝢[o)Hx`2, N:oS[P=7tUрH G _uN OJ/>?G^OӮ}= R>>}؅1?Vdo&wigjj7G%̊ )u噗46Pƽa9_f KU}x _a~gEG?c}]~̳cD9e_P62LHPab.HVH$C@WXag \W 3ib B݇iĒ,矸ROOKN}l/0 r~GǴ=(i~?ĿBn~i}d%ų_0p>3zAߟ|G#$WȽ 4IzW'q>$}a?$G16?_>IOr>|'Wߟ/+v+ Bޘs_c+P#z {hpm6hLi沔&^׫=[nG630FӫpƂZQ{.kGqܡB,X0Նð]Y}iUPo#Bra0xpXۭ!lK E0d!(vrP`dA5)#I lGaɩx qrh4[~LQ`wRr:1Uu.X_YchӔ LQn.IF%.-Ji@ eU )3.A3z嗸^PAL|SUCoH+bm$1f!1F鋓jvǵYu"SǎK|w{0(bp"8ij!٤ІWDB:(d5tKKs9z]=H[7UЯ)xY^*JaOe-psp;'!H"Y2i@0mQLCop#>ȁQ_d7rO?`{@Q9Cmr5͜8(7]"-̬RH!W>4d9QY1ze +,.V[wWAJD\٥UUzc+-[wТ(\4 -k<HKɵʅIBZ9WyǴ ,q *J/¯OۅqU%eCY'Y˚k;Q $ϣn%Vz4/fpHbBjIJtfu`tef(2̹7rVxЦuB>ú0=WH7i`P'MvUD#t 3H%%Dwr(2ڨZh!V" f#Sƃ=ˎ̹,Ä(с[%DL:"uw sۏ$Kbie #A2U LS4E3EUE$RURU**Jh& &"b( (JHH(@Y9t̫Ovo Yb_vEGIJ!&\s}`$F+ H(ť+ ީaJVxLLg %d:w֊dx!e-r$cNlረ䌔+m5rk)̔ˬ&jE7Bw eHtT43z| Of&a_&z j\rE8Pw fontawesome/NAMESPACE0000644000176200001440000000026214605637270014032 0ustar liggesusers# Generated by roxygen2: do not edit by hand S3method(print,fontawesome) export(fa) export(fa_html_dependency) export(fa_i) export(fa_metadata) export(fa_png) import(htmltools) fontawesome/LICENSE0000644000176200001440000000006614605637270013622 0ustar liggesusersYEAR: 2018-2023 COPYRIGHT HOLDER: fontawesome authors fontawesome/NEWS.md0000644000176200001440000000571414716150363013714 0ustar liggesusers# fontawesome 0.5.3 * Updated icon set to that of Font Awesome 6.5.2. (#119) * Added page on pkgdown site that contains a table showing all of the icons available in the package. (#113) * The `fa()` function now allows percentage values to be used as `height` and `width` args (#117). (#125) * When using `fa_i()`, the `class` value is appended when a fully-qualified `name` is used (#122. (#123, thanks @averissimo!) # fontawesome 0.5.2 * Updated icon set to that of Font Awesome 6.4.2. (#111) # fontawesome 0.5.1 * Updated icon set to that of Font Awesome 6.4.0. (#109) # fontawesome 0.5.0 * Updated icon set to that of Font Awesome 6.2.1. (#102) * Closed #101: added the `vertical_align` argument `fa()` to control vertical alignment of icons. (#103) * Closed #99 and #100: reinstated missing '.woff2' files. (#102) # fontawesome 0.4.0 * Updated icon set to that of Font Awesome 6.2.0. (#96) * It's now possible to reference icons by several of their previous names. For example the old icon names `"contact-card"` and `"vcard"` will map to the current name of `"address-card"`. (#96) * There is now a `prefer_type` argument (default: `"regular"`) that allows you to register a choice between a solid- or regular-type icon should both be available for a specific short name. (#96) # fontawesome 0.3.0 * Closed #80: Updated icon set to that of Font Awesome 6.1. (#85) * Closed #68: full icon names (e.g., `"fab fa-r-project"`) are now properly parsed and verified in the `fa_i()` function. (#77) * Closed #66 and #73: CSS length values (supplied to the `height` or `width` options of the `fa()` function) are now correctly handled when they contain decimals. (#74) # fontawesome 0.2.2 * .ttf font files (and associated CSS) have been added back to the pared down selection of included webfonts (includes .woff and .ttf); this was to re-enable compatibility with the webshot package in Windows. (#61) # fontawesome 0.2.1 * Closed #53: The `margin_right` argument of `fa()` is now functional, defaulting to the `"auto"` margin; a `margin_left` argument was also added with the same default. (#54) * The `"desc"` option in `fa()`'s `a11y` argument is now changed to `"deco"`. # fontawesome 0.2.0 * Closed #42: Support for additional R Markdown output formats with `fa()`: `pdf_document`, `word_document`, `github_document`, `slidy_presentation`, `beamer_presentation`, and `ioslides_presentation`. (#43) * Closed #38: Add accessibility features to SVG icons produced by `fa()` with its new `a11y` argument. (#41) * Fixes a rendering issue with SVG icons in IE11. (#40) * Tooltips can be added to SVG icons prepared by `fa()` by using the new `title` argument. * Closed #44: The collection of font files that support the use of `fa_i()` has been trimmed down to just the '.woff' variety. (#45) * Closed #32, #33: Package dependencies have been greatly reduced. (#35) # fontawesome 0.1.0 * Added functions `fa()`, `fa_i()`, and `fa_png()` for preparing Font Awesome icons in three ways. fontawesome/inst/0000755000176200001440000000000014605640073013563 5ustar liggesusersfontawesome/inst/apps/0000755000176200001440000000000014605637270014533 5ustar liggesusersfontawesome/inst/apps/138-icon-fontawesome/0000755000176200001440000000000014605637270020321 5ustar liggesusersfontawesome/inst/apps/138-icon-fontawesome/app.R0000644000176200001440000000246414605637270021232 0ustar liggesuserslibrary(shiny) library(fontawesome) fa4icons <- c( "eur", "mouse-pointer", "rupee", "cogs", "inr" ) fa5icons <- c( "innosoft", "apple-alt", "sync", "sort-alpha-up", "redo" ) fa6icons <- c( "chart-line", "socks", "bullhorn", "lightbulb", "worm" ) fabicons <- c( "500px", "app-store-ios", "amazon", "btc", "github-alt" ) showIcons <- function(icons) { tags$table( tags$tr(style = "border-bottom: 1px solid black", tags$th("Name"), tags$th("Icon")), lapply(icons, function(name) { tags$tr( tags$td(style = "padding-right: 3em;", name), tags$td(shiny::icon(name)) ) }) ) } ui <- fluidPage( tags$h2("Font Awesome 4 Icons"), p("The following icons are from FontAwesome 4. They should display properly below."), showIcons(fa4icons), tags$h2("Font Awesome 5 Icons"), p("The following icons are from FontAwesome 5. They should display properly below."), showIcons(fa5icons), tags$h2("Font Awesome 6 Icons"), p("The following icons are from FontAwesome 6. They should display properly below."), showIcons(fa6icons), tags$h2("Font Awesome 6 Brand icons"), p("The following icons are from the FontAwesome 6 Brand set. They should display properly below."), showIcons(fabicons) ) shinyApp(ui, function(input, output, session) {}) fontawesome/inst/fontawesome/0000755000176200001440000000000014605640073016112 5ustar liggesusersfontawesome/inst/fontawesome/css/0000755000176200001440000000000014605646413016706 5ustar liggesusersfontawesome/inst/fontawesome/css/all.css0000644000176200001440000042220214605646413020172 0ustar liggesusers/*! * Font Awesome Free 6.5.2 by @fontawesome - https://fontawesome.com * License - https://fontawesome.com/license/free (Icons: CC BY 4.0, Fonts: SIL OFL 1.1, Code: MIT License) * Copyright 2024 Fonticons, Inc. */ .fa { font-family: var(--fa-style-family, "Font Awesome 6 Free"); font-weight: var(--fa-style, 900); } .fa, .fa-classic, .fa-sharp, .fas, .fa-solid, .far, .fa-regular, .fab, .fa-brands { -moz-osx-font-smoothing: grayscale; -webkit-font-smoothing: antialiased; display: var(--fa-display, inline-block); font-style: normal; font-variant: normal; line-height: 1; text-rendering: auto; } .fas, .fa-classic, .fa-solid, .far, .fa-regular { font-family: 'Font Awesome 6 Free'; } .fab, .fa-brands { font-family: 'Font Awesome 6 Brands'; } .fa-1x { font-size: 1em; } .fa-2x { font-size: 2em; } .fa-3x { font-size: 3em; } .fa-4x { font-size: 4em; } .fa-5x { font-size: 5em; } .fa-6x { font-size: 6em; } .fa-7x { font-size: 7em; } .fa-8x { font-size: 8em; } .fa-9x { font-size: 9em; } .fa-10x { font-size: 10em; } .fa-2xs { font-size: 0.625em; line-height: 0.1em; vertical-align: 0.225em; } .fa-xs { font-size: 0.75em; line-height: 0.08333em; vertical-align: 0.125em; } .fa-sm { font-size: 0.875em; line-height: 0.07143em; vertical-align: 0.05357em; } .fa-lg { font-size: 1.25em; line-height: 0.05em; vertical-align: -0.075em; } .fa-xl { font-size: 1.5em; line-height: 0.04167em; vertical-align: -0.125em; } .fa-2xl { font-size: 2em; line-height: 0.03125em; vertical-align: -0.1875em; } .fa-fw { text-align: center; width: 1.25em; } .fa-ul { list-style-type: none; margin-left: var(--fa-li-margin, 2.5em); padding-left: 0; } .fa-ul > li { position: relative; } .fa-li { left: calc(var(--fa-li-width, 2em) * -1); position: absolute; text-align: center; width: var(--fa-li-width, 2em); line-height: inherit; } .fa-border { border-color: var(--fa-border-color, #eee); border-radius: var(--fa-border-radius, 0.1em); border-style: var(--fa-border-style, solid); border-width: var(--fa-border-width, 0.08em); padding: var(--fa-border-padding, 0.2em 0.25em 0.15em); } .fa-pull-left { float: left; margin-right: var(--fa-pull-margin, 0.3em); } .fa-pull-right { float: right; margin-left: var(--fa-pull-margin, 0.3em); } .fa-beat { -webkit-animation-name: fa-beat; animation-name: fa-beat; -webkit-animation-delay: var(--fa-animation-delay, 0s); animation-delay: var(--fa-animation-delay, 0s); -webkit-animation-direction: var(--fa-animation-direction, normal); animation-direction: var(--fa-animation-direction, normal); -webkit-animation-duration: var(--fa-animation-duration, 1s); animation-duration: var(--fa-animation-duration, 1s); -webkit-animation-iteration-count: var(--fa-animation-iteration-count, infinite); animation-iteration-count: var(--fa-animation-iteration-count, infinite); -webkit-animation-timing-function: var(--fa-animation-timing, ease-in-out); animation-timing-function: var(--fa-animation-timing, ease-in-out); } .fa-bounce { -webkit-animation-name: fa-bounce; animation-name: fa-bounce; -webkit-animation-delay: var(--fa-animation-delay, 0s); animation-delay: var(--fa-animation-delay, 0s); -webkit-animation-direction: var(--fa-animation-direction, normal); animation-direction: var(--fa-animation-direction, normal); -webkit-animation-duration: var(--fa-animation-duration, 1s); animation-duration: var(--fa-animation-duration, 1s); -webkit-animation-iteration-count: var(--fa-animation-iteration-count, infinite); animation-iteration-count: var(--fa-animation-iteration-count, infinite); -webkit-animation-timing-function: var(--fa-animation-timing, cubic-bezier(0.28, 0.84, 0.42, 1)); animation-timing-function: var(--fa-animation-timing, cubic-bezier(0.28, 0.84, 0.42, 1)); } .fa-fade { -webkit-animation-name: fa-fade; animation-name: fa-fade; -webkit-animation-delay: var(--fa-animation-delay, 0s); animation-delay: var(--fa-animation-delay, 0s); -webkit-animation-direction: var(--fa-animation-direction, normal); animation-direction: var(--fa-animation-direction, normal); -webkit-animation-duration: var(--fa-animation-duration, 1s); animation-duration: var(--fa-animation-duration, 1s); -webkit-animation-iteration-count: var(--fa-animation-iteration-count, infinite); animation-iteration-count: var(--fa-animation-iteration-count, infinite); -webkit-animation-timing-function: var(--fa-animation-timing, cubic-bezier(0.4, 0, 0.6, 1)); animation-timing-function: var(--fa-animation-timing, cubic-bezier(0.4, 0, 0.6, 1)); } .fa-beat-fade { -webkit-animation-name: fa-beat-fade; animation-name: fa-beat-fade; -webkit-animation-delay: var(--fa-animation-delay, 0s); animation-delay: var(--fa-animation-delay, 0s); -webkit-animation-direction: var(--fa-animation-direction, normal); animation-direction: var(--fa-animation-direction, normal); -webkit-animation-duration: var(--fa-animation-duration, 1s); animation-duration: var(--fa-animation-duration, 1s); -webkit-animation-iteration-count: var(--fa-animation-iteration-count, infinite); animation-iteration-count: var(--fa-animation-iteration-count, infinite); -webkit-animation-timing-function: var(--fa-animation-timing, cubic-bezier(0.4, 0, 0.6, 1)); animation-timing-function: var(--fa-animation-timing, cubic-bezier(0.4, 0, 0.6, 1)); } .fa-flip { -webkit-animation-name: fa-flip; animation-name: fa-flip; -webkit-animation-delay: var(--fa-animation-delay, 0s); animation-delay: var(--fa-animation-delay, 0s); -webkit-animation-direction: var(--fa-animation-direction, normal); animation-direction: var(--fa-animation-direction, normal); -webkit-animation-duration: var(--fa-animation-duration, 1s); animation-duration: var(--fa-animation-duration, 1s); -webkit-animation-iteration-count: var(--fa-animation-iteration-count, infinite); animation-iteration-count: var(--fa-animation-iteration-count, infinite); -webkit-animation-timing-function: var(--fa-animation-timing, ease-in-out); animation-timing-function: var(--fa-animation-timing, ease-in-out); } .fa-shake { -webkit-animation-name: fa-shake; animation-name: fa-shake; -webkit-animation-delay: var(--fa-animation-delay, 0s); animation-delay: var(--fa-animation-delay, 0s); -webkit-animation-direction: var(--fa-animation-direction, normal); animation-direction: var(--fa-animation-direction, normal); -webkit-animation-duration: var(--fa-animation-duration, 1s); animation-duration: var(--fa-animation-duration, 1s); -webkit-animation-iteration-count: var(--fa-animation-iteration-count, infinite); animation-iteration-count: var(--fa-animation-iteration-count, infinite); -webkit-animation-timing-function: var(--fa-animation-timing, linear); animation-timing-function: var(--fa-animation-timing, linear); } .fa-spin { -webkit-animation-name: fa-spin; animation-name: fa-spin; -webkit-animation-delay: var(--fa-animation-delay, 0s); animation-delay: var(--fa-animation-delay, 0s); -webkit-animation-direction: var(--fa-animation-direction, normal); animation-direction: var(--fa-animation-direction, normal); -webkit-animation-duration: var(--fa-animation-duration, 2s); animation-duration: var(--fa-animation-duration, 2s); -webkit-animation-iteration-count: var(--fa-animation-iteration-count, infinite); animation-iteration-count: var(--fa-animation-iteration-count, infinite); -webkit-animation-timing-function: var(--fa-animation-timing, linear); animation-timing-function: var(--fa-animation-timing, linear); } .fa-spin-reverse { --fa-animation-direction: reverse; } .fa-pulse, .fa-spin-pulse { -webkit-animation-name: fa-spin; animation-name: fa-spin; -webkit-animation-direction: var(--fa-animation-direction, normal); animation-direction: var(--fa-animation-direction, normal); -webkit-animation-duration: var(--fa-animation-duration, 1s); animation-duration: var(--fa-animation-duration, 1s); -webkit-animation-iteration-count: var(--fa-animation-iteration-count, infinite); animation-iteration-count: var(--fa-animation-iteration-count, infinite); -webkit-animation-timing-function: var(--fa-animation-timing, steps(8)); animation-timing-function: var(--fa-animation-timing, steps(8)); } @media (prefers-reduced-motion: reduce) { .fa-beat, .fa-bounce, .fa-fade, .fa-beat-fade, .fa-flip, .fa-pulse, .fa-shake, .fa-spin, .fa-spin-pulse { -webkit-animation-delay: -1ms; animation-delay: -1ms; -webkit-animation-duration: 1ms; animation-duration: 1ms; -webkit-animation-iteration-count: 1; animation-iteration-count: 1; -webkit-transition-delay: 0s; transition-delay: 0s; -webkit-transition-duration: 0s; transition-duration: 0s; } } @-webkit-keyframes fa-beat { 0%, 90% { -webkit-transform: scale(1); transform: scale(1); } 45% { -webkit-transform: scale(var(--fa-beat-scale, 1.25)); transform: scale(var(--fa-beat-scale, 1.25)); } } @keyframes fa-beat { 0%, 90% { -webkit-transform: scale(1); transform: scale(1); } 45% { -webkit-transform: scale(var(--fa-beat-scale, 1.25)); transform: scale(var(--fa-beat-scale, 1.25)); } } @-webkit-keyframes fa-bounce { 0% { -webkit-transform: scale(1, 1) translateY(0); transform: scale(1, 1) translateY(0); } 10% { -webkit-transform: scale(var(--fa-bounce-start-scale-x, 1.1), var(--fa-bounce-start-scale-y, 0.9)) translateY(0); transform: scale(var(--fa-bounce-start-scale-x, 1.1), var(--fa-bounce-start-scale-y, 0.9)) translateY(0); } 30% { -webkit-transform: scale(var(--fa-bounce-jump-scale-x, 0.9), var(--fa-bounce-jump-scale-y, 1.1)) translateY(var(--fa-bounce-height, -0.5em)); transform: scale(var(--fa-bounce-jump-scale-x, 0.9), var(--fa-bounce-jump-scale-y, 1.1)) translateY(var(--fa-bounce-height, -0.5em)); } 50% { -webkit-transform: scale(var(--fa-bounce-land-scale-x, 1.05), var(--fa-bounce-land-scale-y, 0.95)) translateY(0); transform: scale(var(--fa-bounce-land-scale-x, 1.05), var(--fa-bounce-land-scale-y, 0.95)) translateY(0); } 57% { -webkit-transform: scale(1, 1) translateY(var(--fa-bounce-rebound, -0.125em)); transform: scale(1, 1) translateY(var(--fa-bounce-rebound, -0.125em)); } 64% { -webkit-transform: scale(1, 1) translateY(0); transform: scale(1, 1) translateY(0); } 100% { -webkit-transform: scale(1, 1) translateY(0); transform: scale(1, 1) translateY(0); } } @keyframes fa-bounce { 0% { -webkit-transform: scale(1, 1) translateY(0); transform: scale(1, 1) translateY(0); } 10% { -webkit-transform: scale(var(--fa-bounce-start-scale-x, 1.1), var(--fa-bounce-start-scale-y, 0.9)) translateY(0); transform: scale(var(--fa-bounce-start-scale-x, 1.1), var(--fa-bounce-start-scale-y, 0.9)) translateY(0); } 30% { -webkit-transform: scale(var(--fa-bounce-jump-scale-x, 0.9), var(--fa-bounce-jump-scale-y, 1.1)) translateY(var(--fa-bounce-height, -0.5em)); transform: scale(var(--fa-bounce-jump-scale-x, 0.9), var(--fa-bounce-jump-scale-y, 1.1)) translateY(var(--fa-bounce-height, -0.5em)); } 50% { -webkit-transform: scale(var(--fa-bounce-land-scale-x, 1.05), var(--fa-bounce-land-scale-y, 0.95)) translateY(0); transform: scale(var(--fa-bounce-land-scale-x, 1.05), var(--fa-bounce-land-scale-y, 0.95)) translateY(0); } 57% { -webkit-transform: scale(1, 1) translateY(var(--fa-bounce-rebound, -0.125em)); transform: scale(1, 1) translateY(var(--fa-bounce-rebound, -0.125em)); } 64% { -webkit-transform: scale(1, 1) translateY(0); transform: scale(1, 1) translateY(0); } 100% { -webkit-transform: scale(1, 1) translateY(0); transform: scale(1, 1) translateY(0); } } @-webkit-keyframes fa-fade { 50% { opacity: var(--fa-fade-opacity, 0.4); } } @keyframes fa-fade { 50% { opacity: var(--fa-fade-opacity, 0.4); } } @-webkit-keyframes fa-beat-fade { 0%, 100% { opacity: var(--fa-beat-fade-opacity, 0.4); -webkit-transform: scale(1); transform: scale(1); } 50% { opacity: 1; -webkit-transform: scale(var(--fa-beat-fade-scale, 1.125)); transform: scale(var(--fa-beat-fade-scale, 1.125)); } } @keyframes fa-beat-fade { 0%, 100% { opacity: var(--fa-beat-fade-opacity, 0.4); -webkit-transform: scale(1); transform: scale(1); } 50% { opacity: 1; -webkit-transform: scale(var(--fa-beat-fade-scale, 1.125)); transform: scale(var(--fa-beat-fade-scale, 1.125)); } } @-webkit-keyframes fa-flip { 50% { -webkit-transform: rotate3d(var(--fa-flip-x, 0), var(--fa-flip-y, 1), var(--fa-flip-z, 0), var(--fa-flip-angle, -180deg)); transform: rotate3d(var(--fa-flip-x, 0), var(--fa-flip-y, 1), var(--fa-flip-z, 0), var(--fa-flip-angle, -180deg)); } } @keyframes fa-flip { 50% { -webkit-transform: rotate3d(var(--fa-flip-x, 0), var(--fa-flip-y, 1), var(--fa-flip-z, 0), var(--fa-flip-angle, -180deg)); transform: rotate3d(var(--fa-flip-x, 0), var(--fa-flip-y, 1), var(--fa-flip-z, 0), var(--fa-flip-angle, -180deg)); } } @-webkit-keyframes fa-shake { 0% { -webkit-transform: rotate(-15deg); transform: rotate(-15deg); } 4% { -webkit-transform: rotate(15deg); transform: rotate(15deg); } 8%, 24% { -webkit-transform: rotate(-18deg); transform: rotate(-18deg); } 12%, 28% { -webkit-transform: rotate(18deg); transform: rotate(18deg); } 16% { -webkit-transform: rotate(-22deg); transform: rotate(-22deg); } 20% { -webkit-transform: rotate(22deg); transform: rotate(22deg); } 32% { -webkit-transform: rotate(-12deg); transform: rotate(-12deg); } 36% { -webkit-transform: rotate(12deg); transform: rotate(12deg); } 40%, 100% { -webkit-transform: rotate(0deg); transform: rotate(0deg); } } @keyframes fa-shake { 0% { -webkit-transform: rotate(-15deg); transform: rotate(-15deg); } 4% { -webkit-transform: rotate(15deg); transform: rotate(15deg); } 8%, 24% { -webkit-transform: rotate(-18deg); transform: rotate(-18deg); } 12%, 28% { -webkit-transform: rotate(18deg); transform: rotate(18deg); } 16% { -webkit-transform: rotate(-22deg); transform: rotate(-22deg); } 20% { -webkit-transform: rotate(22deg); transform: rotate(22deg); } 32% { -webkit-transform: rotate(-12deg); transform: rotate(-12deg); } 36% { -webkit-transform: rotate(12deg); transform: rotate(12deg); } 40%, 100% { -webkit-transform: rotate(0deg); transform: rotate(0deg); } } @-webkit-keyframes fa-spin { 0% { -webkit-transform: rotate(0deg); transform: rotate(0deg); } 100% { -webkit-transform: rotate(360deg); transform: rotate(360deg); } } @keyframes fa-spin { 0% { -webkit-transform: rotate(0deg); transform: rotate(0deg); } 100% { -webkit-transform: rotate(360deg); transform: rotate(360deg); } } .fa-rotate-90 { -webkit-transform: rotate(90deg); transform: rotate(90deg); } .fa-rotate-180 { -webkit-transform: rotate(180deg); transform: rotate(180deg); } .fa-rotate-270 { -webkit-transform: rotate(270deg); transform: rotate(270deg); } .fa-flip-horizontal { -webkit-transform: scale(-1, 1); transform: scale(-1, 1); } .fa-flip-vertical { -webkit-transform: scale(1, -1); transform: scale(1, -1); } .fa-flip-both, .fa-flip-horizontal.fa-flip-vertical { -webkit-transform: scale(-1, -1); transform: scale(-1, -1); } .fa-rotate-by { -webkit-transform: rotate(var(--fa-rotate-angle, 0)); transform: rotate(var(--fa-rotate-angle, 0)); } .fa-stack { display: inline-block; height: 2em; line-height: 2em; position: relative; vertical-align: middle; width: 2.5em; } .fa-stack-1x, .fa-stack-2x { left: 0; position: absolute; text-align: center; width: 100%; z-index: var(--fa-stack-z-index, auto); } .fa-stack-1x { line-height: inherit; } .fa-stack-2x { font-size: 2em; } .fa-inverse { color: var(--fa-inverse, #fff); } /* Font Awesome uses the Unicode Private Use Area (PUA) to ensure screen readers do not read off random characters that represent icons */ .fa-0::before { content: "\30"; } .fa-1::before { content: "\31"; } .fa-2::before { content: "\32"; } .fa-3::before { content: "\33"; } .fa-4::before { content: "\34"; } .fa-5::before { content: "\35"; } .fa-6::before { content: "\36"; } .fa-7::before { content: "\37"; } .fa-8::before { content: "\38"; } .fa-9::before { content: "\39"; } .fa-fill-drip::before { content: "\f576"; } .fa-arrows-to-circle::before { content: "\e4bd"; } .fa-circle-chevron-right::before { content: "\f138"; } .fa-chevron-circle-right::before { content: "\f138"; } .fa-at::before { content: "\40"; } .fa-trash-can::before { content: "\f2ed"; } .fa-trash-alt::before { content: "\f2ed"; } .fa-text-height::before { content: "\f034"; } .fa-user-xmark::before { content: "\f235"; } .fa-user-times::before { content: "\f235"; } .fa-stethoscope::before { content: "\f0f1"; } .fa-message::before { content: "\f27a"; } .fa-comment-alt::before { content: "\f27a"; } .fa-info::before { content: "\f129"; } .fa-down-left-and-up-right-to-center::before { content: "\f422"; } .fa-compress-alt::before { content: "\f422"; } .fa-explosion::before { content: "\e4e9"; } .fa-file-lines::before { content: "\f15c"; } .fa-file-alt::before { content: "\f15c"; } .fa-file-text::before { content: "\f15c"; } .fa-wave-square::before { content: "\f83e"; } .fa-ring::before { content: "\f70b"; } .fa-building-un::before { content: "\e4d9"; } .fa-dice-three::before { content: "\f527"; } .fa-calendar-days::before { content: "\f073"; } .fa-calendar-alt::before { content: "\f073"; } .fa-anchor-circle-check::before { content: "\e4aa"; } .fa-building-circle-arrow-right::before { content: "\e4d1"; } .fa-volleyball::before { content: "\f45f"; } .fa-volleyball-ball::before { content: "\f45f"; } .fa-arrows-up-to-line::before { content: "\e4c2"; } .fa-sort-down::before { content: "\f0dd"; } .fa-sort-desc::before { content: "\f0dd"; } .fa-circle-minus::before { content: "\f056"; } .fa-minus-circle::before { content: "\f056"; } .fa-door-open::before { content: "\f52b"; } .fa-right-from-bracket::before { content: "\f2f5"; } .fa-sign-out-alt::before { content: "\f2f5"; } .fa-atom::before { content: "\f5d2"; } .fa-soap::before { content: "\e06e"; } .fa-icons::before { content: "\f86d"; } .fa-heart-music-camera-bolt::before { content: "\f86d"; } .fa-microphone-lines-slash::before { content: "\f539"; } .fa-microphone-alt-slash::before { content: "\f539"; } .fa-bridge-circle-check::before { content: "\e4c9"; } .fa-pump-medical::before { content: "\e06a"; } .fa-fingerprint::before { content: "\f577"; } .fa-hand-point-right::before { content: "\f0a4"; } .fa-magnifying-glass-location::before { content: "\f689"; } .fa-search-location::before { content: "\f689"; } .fa-forward-step::before { content: "\f051"; } .fa-step-forward::before { content: "\f051"; } .fa-face-smile-beam::before { content: "\f5b8"; } .fa-smile-beam::before { content: "\f5b8"; } .fa-flag-checkered::before { content: "\f11e"; } .fa-football::before { content: "\f44e"; } .fa-football-ball::before { content: "\f44e"; } .fa-school-circle-exclamation::before { content: "\e56c"; } .fa-crop::before { content: "\f125"; } .fa-angles-down::before { content: "\f103"; } .fa-angle-double-down::before { content: "\f103"; } .fa-users-rectangle::before { content: "\e594"; } .fa-people-roof::before { content: "\e537"; } .fa-people-line::before { content: "\e534"; } .fa-beer-mug-empty::before { content: "\f0fc"; } .fa-beer::before { content: "\f0fc"; } .fa-diagram-predecessor::before { content: "\e477"; } .fa-arrow-up-long::before { content: "\f176"; } .fa-long-arrow-up::before { content: "\f176"; } .fa-fire-flame-simple::before { content: "\f46a"; } .fa-burn::before { content: "\f46a"; } .fa-person::before { content: "\f183"; } .fa-male::before { content: "\f183"; } .fa-laptop::before { content: "\f109"; } .fa-file-csv::before { content: "\f6dd"; } .fa-menorah::before { content: "\f676"; } .fa-truck-plane::before { content: "\e58f"; } .fa-record-vinyl::before { content: "\f8d9"; } .fa-face-grin-stars::before { content: "\f587"; } .fa-grin-stars::before { content: "\f587"; } .fa-bong::before { content: "\f55c"; } .fa-spaghetti-monster-flying::before { content: "\f67b"; } .fa-pastafarianism::before { content: "\f67b"; } .fa-arrow-down-up-across-line::before { content: "\e4af"; } .fa-spoon::before { content: "\f2e5"; } .fa-utensil-spoon::before { content: "\f2e5"; } .fa-jar-wheat::before { content: "\e517"; } .fa-envelopes-bulk::before { content: "\f674"; } .fa-mail-bulk::before { content: "\f674"; } .fa-file-circle-exclamation::before { content: "\e4eb"; } .fa-circle-h::before { content: "\f47e"; } .fa-hospital-symbol::before { content: "\f47e"; } .fa-pager::before { content: "\f815"; } .fa-address-book::before { content: "\f2b9"; } .fa-contact-book::before { content: "\f2b9"; } .fa-strikethrough::before { content: "\f0cc"; } .fa-k::before { content: "\4b"; } .fa-landmark-flag::before { content: "\e51c"; } .fa-pencil::before { content: "\f303"; } .fa-pencil-alt::before { content: "\f303"; } .fa-backward::before { content: "\f04a"; } .fa-caret-right::before { content: "\f0da"; } .fa-comments::before { content: "\f086"; } .fa-paste::before { content: "\f0ea"; } .fa-file-clipboard::before { content: "\f0ea"; } .fa-code-pull-request::before { content: "\e13c"; } .fa-clipboard-list::before { content: "\f46d"; } .fa-truck-ramp-box::before { content: "\f4de"; } .fa-truck-loading::before { content: "\f4de"; } .fa-user-check::before { content: "\f4fc"; } .fa-vial-virus::before { content: "\e597"; } .fa-sheet-plastic::before { content: "\e571"; } .fa-blog::before { content: "\f781"; } .fa-user-ninja::before { content: "\f504"; } .fa-person-arrow-up-from-line::before { content: "\e539"; } .fa-scroll-torah::before { content: "\f6a0"; } .fa-torah::before { content: "\f6a0"; } .fa-broom-ball::before { content: "\f458"; } .fa-quidditch::before { content: "\f458"; } .fa-quidditch-broom-ball::before { content: "\f458"; } .fa-toggle-off::before { content: "\f204"; } .fa-box-archive::before { content: "\f187"; } .fa-archive::before { content: "\f187"; } .fa-person-drowning::before { content: "\e545"; } .fa-arrow-down-9-1::before { content: "\f886"; } .fa-sort-numeric-desc::before { content: "\f886"; } .fa-sort-numeric-down-alt::before { content: "\f886"; } .fa-face-grin-tongue-squint::before { content: "\f58a"; } .fa-grin-tongue-squint::before { content: "\f58a"; } .fa-spray-can::before { content: "\f5bd"; } .fa-truck-monster::before { content: "\f63b"; } .fa-w::before { content: "\57"; } .fa-earth-africa::before { content: "\f57c"; } .fa-globe-africa::before { content: "\f57c"; } .fa-rainbow::before { content: "\f75b"; } .fa-circle-notch::before { content: "\f1ce"; } .fa-tablet-screen-button::before { content: "\f3fa"; } .fa-tablet-alt::before { content: "\f3fa"; } .fa-paw::before { content: "\f1b0"; } .fa-cloud::before { content: "\f0c2"; } .fa-trowel-bricks::before { content: "\e58a"; } .fa-face-flushed::before { content: "\f579"; } .fa-flushed::before { content: "\f579"; } .fa-hospital-user::before { content: "\f80d"; } .fa-tent-arrow-left-right::before { content: "\e57f"; } .fa-gavel::before { content: "\f0e3"; } .fa-legal::before { content: "\f0e3"; } .fa-binoculars::before { content: "\f1e5"; } .fa-microphone-slash::before { content: "\f131"; } .fa-box-tissue::before { content: "\e05b"; } .fa-motorcycle::before { content: "\f21c"; } .fa-bell-concierge::before { content: "\f562"; } .fa-concierge-bell::before { content: "\f562"; } .fa-pen-ruler::before { content: "\f5ae"; } .fa-pencil-ruler::before { content: "\f5ae"; } .fa-people-arrows::before { content: "\e068"; } .fa-people-arrows-left-right::before { content: "\e068"; } .fa-mars-and-venus-burst::before { content: "\e523"; } .fa-square-caret-right::before { content: "\f152"; } .fa-caret-square-right::before { content: "\f152"; } .fa-scissors::before { content: "\f0c4"; } .fa-cut::before { content: "\f0c4"; } .fa-sun-plant-wilt::before { content: "\e57a"; } .fa-toilets-portable::before { content: "\e584"; } .fa-hockey-puck::before { content: "\f453"; } .fa-table::before { content: "\f0ce"; } .fa-magnifying-glass-arrow-right::before { content: "\e521"; } .fa-tachograph-digital::before { content: "\f566"; } .fa-digital-tachograph::before { content: "\f566"; } .fa-users-slash::before { content: "\e073"; } .fa-clover::before { content: "\e139"; } .fa-reply::before { content: "\f3e5"; } .fa-mail-reply::before { content: "\f3e5"; } .fa-star-and-crescent::before { content: "\f699"; } .fa-house-fire::before { content: "\e50c"; } .fa-square-minus::before { content: "\f146"; } .fa-minus-square::before { content: "\f146"; } .fa-helicopter::before { content: "\f533"; } .fa-compass::before { content: "\f14e"; } .fa-square-caret-down::before { content: "\f150"; } .fa-caret-square-down::before { content: "\f150"; } .fa-file-circle-question::before { content: "\e4ef"; } .fa-laptop-code::before { content: "\f5fc"; } .fa-swatchbook::before { content: "\f5c3"; } .fa-prescription-bottle::before { content: "\f485"; } .fa-bars::before { content: "\f0c9"; } .fa-navicon::before { content: "\f0c9"; } .fa-people-group::before { content: "\e533"; } .fa-hourglass-end::before { content: "\f253"; } .fa-hourglass-3::before { content: "\f253"; } .fa-heart-crack::before { content: "\f7a9"; } .fa-heart-broken::before { content: "\f7a9"; } .fa-square-up-right::before { content: "\f360"; } .fa-external-link-square-alt::before { content: "\f360"; } .fa-face-kiss-beam::before { content: "\f597"; } .fa-kiss-beam::before { content: "\f597"; } .fa-film::before { content: "\f008"; } .fa-ruler-horizontal::before { content: "\f547"; } .fa-people-robbery::before { content: "\e536"; } .fa-lightbulb::before { content: "\f0eb"; } .fa-caret-left::before { content: "\f0d9"; } .fa-circle-exclamation::before { content: "\f06a"; } .fa-exclamation-circle::before { content: "\f06a"; } .fa-school-circle-xmark::before { content: "\e56d"; } .fa-arrow-right-from-bracket::before { content: "\f08b"; } .fa-sign-out::before { content: "\f08b"; } .fa-circle-chevron-down::before { content: "\f13a"; } .fa-chevron-circle-down::before { content: "\f13a"; } .fa-unlock-keyhole::before { content: "\f13e"; } .fa-unlock-alt::before { content: "\f13e"; } .fa-cloud-showers-heavy::before { content: "\f740"; } .fa-headphones-simple::before { content: "\f58f"; } .fa-headphones-alt::before { content: "\f58f"; } .fa-sitemap::before { content: "\f0e8"; } .fa-circle-dollar-to-slot::before { content: "\f4b9"; } .fa-donate::before { content: "\f4b9"; } .fa-memory::before { content: "\f538"; } .fa-road-spikes::before { content: "\e568"; } .fa-fire-burner::before { content: "\e4f1"; } .fa-flag::before { content: "\f024"; } .fa-hanukiah::before { content: "\f6e6"; } .fa-feather::before { content: "\f52d"; } .fa-volume-low::before { content: "\f027"; } .fa-volume-down::before { content: "\f027"; } .fa-comment-slash::before { content: "\f4b3"; } .fa-cloud-sun-rain::before { content: "\f743"; } .fa-compress::before { content: "\f066"; } .fa-wheat-awn::before { content: "\e2cd"; } .fa-wheat-alt::before { content: "\e2cd"; } .fa-ankh::before { content: "\f644"; } .fa-hands-holding-child::before { content: "\e4fa"; } .fa-asterisk::before { content: "\2a"; } .fa-square-check::before { content: "\f14a"; } .fa-check-square::before { content: "\f14a"; } .fa-peseta-sign::before { content: "\e221"; } .fa-heading::before { content: "\f1dc"; } .fa-header::before { content: "\f1dc"; } .fa-ghost::before { content: "\f6e2"; } .fa-list::before { content: "\f03a"; } .fa-list-squares::before { content: "\f03a"; } .fa-square-phone-flip::before { content: "\f87b"; } .fa-phone-square-alt::before { content: "\f87b"; } .fa-cart-plus::before { content: "\f217"; } .fa-gamepad::before { content: "\f11b"; } .fa-circle-dot::before { content: "\f192"; } .fa-dot-circle::before { content: "\f192"; } .fa-face-dizzy::before { content: "\f567"; } .fa-dizzy::before { content: "\f567"; } .fa-egg::before { content: "\f7fb"; } .fa-house-medical-circle-xmark::before { content: "\e513"; } .fa-campground::before { content: "\f6bb"; } .fa-folder-plus::before { content: "\f65e"; } .fa-futbol::before { content: "\f1e3"; } .fa-futbol-ball::before { content: "\f1e3"; } .fa-soccer-ball::before { content: "\f1e3"; } .fa-paintbrush::before { content: "\f1fc"; } .fa-paint-brush::before { content: "\f1fc"; } .fa-lock::before { content: "\f023"; } .fa-gas-pump::before { content: "\f52f"; } .fa-hot-tub-person::before { content: "\f593"; } .fa-hot-tub::before { content: "\f593"; } .fa-map-location::before { content: "\f59f"; } .fa-map-marked::before { content: "\f59f"; } .fa-house-flood-water::before { content: "\e50e"; } .fa-tree::before { content: "\f1bb"; } .fa-bridge-lock::before { content: "\e4cc"; } .fa-sack-dollar::before { content: "\f81d"; } .fa-pen-to-square::before { content: "\f044"; } .fa-edit::before { content: "\f044"; } .fa-car-side::before { content: "\f5e4"; } .fa-share-nodes::before { content: "\f1e0"; } .fa-share-alt::before { content: "\f1e0"; } .fa-heart-circle-minus::before { content: "\e4ff"; } .fa-hourglass-half::before { content: "\f252"; } .fa-hourglass-2::before { content: "\f252"; } .fa-microscope::before { content: "\f610"; } .fa-sink::before { content: "\e06d"; } .fa-bag-shopping::before { content: "\f290"; } .fa-shopping-bag::before { content: "\f290"; } .fa-arrow-down-z-a::before { content: "\f881"; } .fa-sort-alpha-desc::before { content: "\f881"; } .fa-sort-alpha-down-alt::before { content: "\f881"; } .fa-mitten::before { content: "\f7b5"; } .fa-person-rays::before { content: "\e54d"; } .fa-users::before { content: "\f0c0"; } .fa-eye-slash::before { content: "\f070"; } .fa-flask-vial::before { content: "\e4f3"; } .fa-hand::before { content: "\f256"; } .fa-hand-paper::before { content: "\f256"; } .fa-om::before { content: "\f679"; } .fa-worm::before { content: "\e599"; } .fa-house-circle-xmark::before { content: "\e50b"; } .fa-plug::before { content: "\f1e6"; } .fa-chevron-up::before { content: "\f077"; } .fa-hand-spock::before { content: "\f259"; } .fa-stopwatch::before { content: "\f2f2"; } .fa-face-kiss::before { content: "\f596"; } .fa-kiss::before { content: "\f596"; } .fa-bridge-circle-xmark::before { content: "\e4cb"; } .fa-face-grin-tongue::before { content: "\f589"; } .fa-grin-tongue::before { content: "\f589"; } .fa-chess-bishop::before { content: "\f43a"; } .fa-face-grin-wink::before { content: "\f58c"; } .fa-grin-wink::before { content: "\f58c"; } .fa-ear-deaf::before { content: "\f2a4"; } .fa-deaf::before { content: "\f2a4"; } .fa-deafness::before { content: "\f2a4"; } .fa-hard-of-hearing::before { content: "\f2a4"; } .fa-road-circle-check::before { content: "\e564"; } .fa-dice-five::before { content: "\f523"; } .fa-square-rss::before { content: "\f143"; } .fa-rss-square::before { content: "\f143"; } .fa-land-mine-on::before { content: "\e51b"; } .fa-i-cursor::before { content: "\f246"; } .fa-stamp::before { content: "\f5bf"; } .fa-stairs::before { content: "\e289"; } .fa-i::before { content: "\49"; } .fa-hryvnia-sign::before { content: "\f6f2"; } .fa-hryvnia::before { content: "\f6f2"; } .fa-pills::before { content: "\f484"; } .fa-face-grin-wide::before { content: "\f581"; } .fa-grin-alt::before { content: "\f581"; } .fa-tooth::before { content: "\f5c9"; } .fa-v::before { content: "\56"; } .fa-bangladeshi-taka-sign::before { content: "\e2e6"; } .fa-bicycle::before { content: "\f206"; } .fa-staff-snake::before { content: "\e579"; } .fa-rod-asclepius::before { content: "\e579"; } .fa-rod-snake::before { content: "\e579"; } .fa-staff-aesculapius::before { content: "\e579"; } .fa-head-side-cough-slash::before { content: "\e062"; } .fa-truck-medical::before { content: "\f0f9"; } .fa-ambulance::before { content: "\f0f9"; } .fa-wheat-awn-circle-exclamation::before { content: "\e598"; } .fa-snowman::before { content: "\f7d0"; } .fa-mortar-pestle::before { content: "\f5a7"; } .fa-road-barrier::before { content: "\e562"; } .fa-school::before { content: "\f549"; } .fa-igloo::before { content: "\f7ae"; } .fa-joint::before { content: "\f595"; } .fa-angle-right::before { content: "\f105"; } .fa-horse::before { content: "\f6f0"; } .fa-q::before { content: "\51"; } .fa-g::before { content: "\47"; } .fa-notes-medical::before { content: "\f481"; } .fa-temperature-half::before { content: "\f2c9"; } .fa-temperature-2::before { content: "\f2c9"; } .fa-thermometer-2::before { content: "\f2c9"; } .fa-thermometer-half::before { content: "\f2c9"; } .fa-dong-sign::before { content: "\e169"; } .fa-capsules::before { content: "\f46b"; } .fa-poo-storm::before { content: "\f75a"; } .fa-poo-bolt::before { content: "\f75a"; } .fa-face-frown-open::before { content: "\f57a"; } .fa-frown-open::before { content: "\f57a"; } .fa-hand-point-up::before { content: "\f0a6"; } .fa-money-bill::before { content: "\f0d6"; } .fa-bookmark::before { content: "\f02e"; } .fa-align-justify::before { content: "\f039"; } .fa-umbrella-beach::before { content: "\f5ca"; } .fa-helmet-un::before { content: "\e503"; } .fa-bullseye::before { content: "\f140"; } .fa-bacon::before { content: "\f7e5"; } .fa-hand-point-down::before { content: "\f0a7"; } .fa-arrow-up-from-bracket::before { content: "\e09a"; } .fa-folder::before { content: "\f07b"; } .fa-folder-blank::before { content: "\f07b"; } .fa-file-waveform::before { content: "\f478"; } .fa-file-medical-alt::before { content: "\f478"; } .fa-radiation::before { content: "\f7b9"; } .fa-chart-simple::before { content: "\e473"; } .fa-mars-stroke::before { content: "\f229"; } .fa-vial::before { content: "\f492"; } .fa-gauge::before { content: "\f624"; } .fa-dashboard::before { content: "\f624"; } .fa-gauge-med::before { content: "\f624"; } .fa-tachometer-alt-average::before { content: "\f624"; } .fa-wand-magic-sparkles::before { content: "\e2ca"; } .fa-magic-wand-sparkles::before { content: "\e2ca"; } .fa-e::before { content: "\45"; } .fa-pen-clip::before { content: "\f305"; } .fa-pen-alt::before { content: "\f305"; } .fa-bridge-circle-exclamation::before { content: "\e4ca"; } .fa-user::before { content: "\f007"; } .fa-school-circle-check::before { content: "\e56b"; } .fa-dumpster::before { content: "\f793"; } .fa-van-shuttle::before { content: "\f5b6"; } .fa-shuttle-van::before { content: "\f5b6"; } .fa-building-user::before { content: "\e4da"; } .fa-square-caret-left::before { content: "\f191"; } .fa-caret-square-left::before { content: "\f191"; } .fa-highlighter::before { content: "\f591"; } .fa-key::before { content: "\f084"; } .fa-bullhorn::before { content: "\f0a1"; } .fa-globe::before { content: "\f0ac"; } .fa-synagogue::before { content: "\f69b"; } .fa-person-half-dress::before { content: "\e548"; } .fa-road-bridge::before { content: "\e563"; } .fa-location-arrow::before { content: "\f124"; } .fa-c::before { content: "\43"; } .fa-tablet-button::before { content: "\f10a"; } .fa-building-lock::before { content: "\e4d6"; } .fa-pizza-slice::before { content: "\f818"; } .fa-money-bill-wave::before { content: "\f53a"; } .fa-chart-area::before { content: "\f1fe"; } .fa-area-chart::before { content: "\f1fe"; } .fa-house-flag::before { content: "\e50d"; } .fa-person-circle-minus::before { content: "\e540"; } .fa-ban::before { content: "\f05e"; } .fa-cancel::before { content: "\f05e"; } .fa-camera-rotate::before { content: "\e0d8"; } .fa-spray-can-sparkles::before { content: "\f5d0"; } .fa-air-freshener::before { content: "\f5d0"; } .fa-star::before { content: "\f005"; } .fa-repeat::before { content: "\f363"; } .fa-cross::before { content: "\f654"; } .fa-box::before { content: "\f466"; } .fa-venus-mars::before { content: "\f228"; } .fa-arrow-pointer::before { content: "\f245"; } .fa-mouse-pointer::before { content: "\f245"; } .fa-maximize::before { content: "\f31e"; } .fa-expand-arrows-alt::before { content: "\f31e"; } .fa-charging-station::before { content: "\f5e7"; } .fa-shapes::before { content: "\f61f"; } .fa-triangle-circle-square::before { content: "\f61f"; } .fa-shuffle::before { content: "\f074"; } .fa-random::before { content: "\f074"; } .fa-person-running::before { content: "\f70c"; } .fa-running::before { content: "\f70c"; } .fa-mobile-retro::before { content: "\e527"; } .fa-grip-lines-vertical::before { content: "\f7a5"; } .fa-spider::before { content: "\f717"; } .fa-hands-bound::before { content: "\e4f9"; } .fa-file-invoice-dollar::before { content: "\f571"; } .fa-plane-circle-exclamation::before { content: "\e556"; } .fa-x-ray::before { content: "\f497"; } .fa-spell-check::before { content: "\f891"; } .fa-slash::before { content: "\f715"; } .fa-computer-mouse::before { content: "\f8cc"; } .fa-mouse::before { content: "\f8cc"; } .fa-arrow-right-to-bracket::before { content: "\f090"; } .fa-sign-in::before { content: "\f090"; } .fa-shop-slash::before { content: "\e070"; } .fa-store-alt-slash::before { content: "\e070"; } .fa-server::before { content: "\f233"; } .fa-virus-covid-slash::before { content: "\e4a9"; } .fa-shop-lock::before { content: "\e4a5"; } .fa-hourglass-start::before { content: "\f251"; } .fa-hourglass-1::before { content: "\f251"; } .fa-blender-phone::before { content: "\f6b6"; } .fa-building-wheat::before { content: "\e4db"; } .fa-person-breastfeeding::before { content: "\e53a"; } .fa-right-to-bracket::before { content: "\f2f6"; } .fa-sign-in-alt::before { content: "\f2f6"; } .fa-venus::before { content: "\f221"; } .fa-passport::before { content: "\f5ab"; } .fa-heart-pulse::before { content: "\f21e"; } .fa-heartbeat::before { content: "\f21e"; } .fa-people-carry-box::before { content: "\f4ce"; } .fa-people-carry::before { content: "\f4ce"; } .fa-temperature-high::before { content: "\f769"; } .fa-microchip::before { content: "\f2db"; } .fa-crown::before { content: "\f521"; } .fa-weight-hanging::before { content: "\f5cd"; } .fa-xmarks-lines::before { content: "\e59a"; } .fa-file-prescription::before { content: "\f572"; } .fa-weight-scale::before { content: "\f496"; } .fa-weight::before { content: "\f496"; } .fa-user-group::before { content: "\f500"; } .fa-user-friends::before { content: "\f500"; } .fa-arrow-up-a-z::before { content: "\f15e"; } .fa-sort-alpha-up::before { content: "\f15e"; } .fa-chess-knight::before { content: "\f441"; } .fa-face-laugh-squint::before { content: "\f59b"; } .fa-laugh-squint::before { content: "\f59b"; } .fa-wheelchair::before { content: "\f193"; } .fa-circle-arrow-up::before { content: "\f0aa"; } .fa-arrow-circle-up::before { content: "\f0aa"; } .fa-toggle-on::before { content: "\f205"; } .fa-person-walking::before { content: "\f554"; } .fa-walking::before { content: "\f554"; } .fa-l::before { content: "\4c"; } .fa-fire::before { content: "\f06d"; } .fa-bed-pulse::before { content: "\f487"; } .fa-procedures::before { content: "\f487"; } .fa-shuttle-space::before { content: "\f197"; } .fa-space-shuttle::before { content: "\f197"; } .fa-face-laugh::before { content: "\f599"; } .fa-laugh::before { content: "\f599"; } .fa-folder-open::before { content: "\f07c"; } .fa-heart-circle-plus::before { content: "\e500"; } .fa-code-fork::before { content: "\e13b"; } .fa-city::before { content: "\f64f"; } .fa-microphone-lines::before { content: "\f3c9"; } .fa-microphone-alt::before { content: "\f3c9"; } .fa-pepper-hot::before { content: "\f816"; } .fa-unlock::before { content: "\f09c"; } .fa-colon-sign::before { content: "\e140"; } .fa-headset::before { content: "\f590"; } .fa-store-slash::before { content: "\e071"; } .fa-road-circle-xmark::before { content: "\e566"; } .fa-user-minus::before { content: "\f503"; } .fa-mars-stroke-up::before { content: "\f22a"; } .fa-mars-stroke-v::before { content: "\f22a"; } .fa-champagne-glasses::before { content: "\f79f"; } .fa-glass-cheers::before { content: "\f79f"; } .fa-clipboard::before { content: "\f328"; } .fa-house-circle-exclamation::before { content: "\e50a"; } .fa-file-arrow-up::before { content: "\f574"; } .fa-file-upload::before { content: "\f574"; } .fa-wifi::before { content: "\f1eb"; } .fa-wifi-3::before { content: "\f1eb"; } .fa-wifi-strong::before { content: "\f1eb"; } .fa-bath::before { content: "\f2cd"; } .fa-bathtub::before { content: "\f2cd"; } .fa-underline::before { content: "\f0cd"; } .fa-user-pen::before { content: "\f4ff"; } .fa-user-edit::before { content: "\f4ff"; } .fa-signature::before { content: "\f5b7"; } .fa-stroopwafel::before { content: "\f551"; } .fa-bold::before { content: "\f032"; } .fa-anchor-lock::before { content: "\e4ad"; } .fa-building-ngo::before { content: "\e4d7"; } .fa-manat-sign::before { content: "\e1d5"; } .fa-not-equal::before { content: "\f53e"; } .fa-border-top-left::before { content: "\f853"; } .fa-border-style::before { content: "\f853"; } .fa-map-location-dot::before { content: "\f5a0"; } .fa-map-marked-alt::before { content: "\f5a0"; } .fa-jedi::before { content: "\f669"; } .fa-square-poll-vertical::before { content: "\f681"; } .fa-poll::before { content: "\f681"; } .fa-mug-hot::before { content: "\f7b6"; } .fa-car-battery::before { content: "\f5df"; } .fa-battery-car::before { content: "\f5df"; } .fa-gift::before { content: "\f06b"; } .fa-dice-two::before { content: "\f528"; } .fa-chess-queen::before { content: "\f445"; } .fa-glasses::before { content: "\f530"; } .fa-chess-board::before { content: "\f43c"; } .fa-building-circle-check::before { content: "\e4d2"; } .fa-person-chalkboard::before { content: "\e53d"; } .fa-mars-stroke-right::before { content: "\f22b"; } .fa-mars-stroke-h::before { content: "\f22b"; } .fa-hand-back-fist::before { content: "\f255"; } .fa-hand-rock::before { content: "\f255"; } .fa-square-caret-up::before { content: "\f151"; } .fa-caret-square-up::before { content: "\f151"; } .fa-cloud-showers-water::before { content: "\e4e4"; } .fa-chart-bar::before { content: "\f080"; } .fa-bar-chart::before { content: "\f080"; } .fa-hands-bubbles::before { content: "\e05e"; } .fa-hands-wash::before { content: "\e05e"; } .fa-less-than-equal::before { content: "\f537"; } .fa-train::before { content: "\f238"; } .fa-eye-low-vision::before { content: "\f2a8"; } .fa-low-vision::before { content: "\f2a8"; } .fa-crow::before { content: "\f520"; } .fa-sailboat::before { content: "\e445"; } .fa-window-restore::before { content: "\f2d2"; } .fa-square-plus::before { content: "\f0fe"; } .fa-plus-square::before { content: "\f0fe"; } .fa-torii-gate::before { content: "\f6a1"; } .fa-frog::before { content: "\f52e"; } .fa-bucket::before { content: "\e4cf"; } .fa-image::before { content: "\f03e"; } .fa-microphone::before { content: "\f130"; } .fa-cow::before { content: "\f6c8"; } .fa-caret-up::before { content: "\f0d8"; } .fa-screwdriver::before { content: "\f54a"; } .fa-folder-closed::before { content: "\e185"; } .fa-house-tsunami::before { content: "\e515"; } .fa-square-nfi::before { content: "\e576"; } .fa-arrow-up-from-ground-water::before { content: "\e4b5"; } .fa-martini-glass::before { content: "\f57b"; } .fa-glass-martini-alt::before { content: "\f57b"; } .fa-rotate-left::before { content: "\f2ea"; } .fa-rotate-back::before { content: "\f2ea"; } .fa-rotate-backward::before { content: "\f2ea"; } .fa-undo-alt::before { content: "\f2ea"; } .fa-table-columns::before { content: "\f0db"; } .fa-columns::before { content: "\f0db"; } .fa-lemon::before { content: "\f094"; } .fa-head-side-mask::before { content: "\e063"; } .fa-handshake::before { content: "\f2b5"; } .fa-gem::before { content: "\f3a5"; } .fa-dolly::before { content: "\f472"; } .fa-dolly-box::before { content: "\f472"; } .fa-smoking::before { content: "\f48d"; } .fa-minimize::before { content: "\f78c"; } .fa-compress-arrows-alt::before { content: "\f78c"; } .fa-monument::before { content: "\f5a6"; } .fa-snowplow::before { content: "\f7d2"; } .fa-angles-right::before { content: "\f101"; } .fa-angle-double-right::before { content: "\f101"; } .fa-cannabis::before { content: "\f55f"; } .fa-circle-play::before { content: "\f144"; } .fa-play-circle::before { content: "\f144"; } .fa-tablets::before { content: "\f490"; } .fa-ethernet::before { content: "\f796"; } .fa-euro-sign::before { content: "\f153"; } .fa-eur::before { content: "\f153"; } .fa-euro::before { content: "\f153"; } .fa-chair::before { content: "\f6c0"; } .fa-circle-check::before { content: "\f058"; } .fa-check-circle::before { content: "\f058"; } .fa-circle-stop::before { content: "\f28d"; } .fa-stop-circle::before { content: "\f28d"; } .fa-compass-drafting::before { content: "\f568"; } .fa-drafting-compass::before { content: "\f568"; } .fa-plate-wheat::before { content: "\e55a"; } .fa-icicles::before { content: "\f7ad"; } .fa-person-shelter::before { content: "\e54f"; } .fa-neuter::before { content: "\f22c"; } .fa-id-badge::before { content: "\f2c1"; } .fa-marker::before { content: "\f5a1"; } .fa-face-laugh-beam::before { content: "\f59a"; } .fa-laugh-beam::before { content: "\f59a"; } .fa-helicopter-symbol::before { content: "\e502"; } .fa-universal-access::before { content: "\f29a"; } .fa-circle-chevron-up::before { content: "\f139"; } .fa-chevron-circle-up::before { content: "\f139"; } .fa-lari-sign::before { content: "\e1c8"; } .fa-volcano::before { content: "\f770"; } .fa-person-walking-dashed-line-arrow-right::before { content: "\e553"; } .fa-sterling-sign::before { content: "\f154"; } .fa-gbp::before { content: "\f154"; } .fa-pound-sign::before { content: "\f154"; } .fa-viruses::before { content: "\e076"; } .fa-square-person-confined::before { content: "\e577"; } .fa-user-tie::before { content: "\f508"; } .fa-arrow-down-long::before { content: "\f175"; } .fa-long-arrow-down::before { content: "\f175"; } .fa-tent-arrow-down-to-line::before { content: "\e57e"; } .fa-certificate::before { content: "\f0a3"; } .fa-reply-all::before { content: "\f122"; } .fa-mail-reply-all::before { content: "\f122"; } .fa-suitcase::before { content: "\f0f2"; } .fa-person-skating::before { content: "\f7c5"; } .fa-skating::before { content: "\f7c5"; } .fa-filter-circle-dollar::before { content: "\f662"; } .fa-funnel-dollar::before { content: "\f662"; } .fa-camera-retro::before { content: "\f083"; } .fa-circle-arrow-down::before { content: "\f0ab"; } .fa-arrow-circle-down::before { content: "\f0ab"; } .fa-file-import::before { content: "\f56f"; } .fa-arrow-right-to-file::before { content: "\f56f"; } .fa-square-arrow-up-right::before { content: "\f14c"; } .fa-external-link-square::before { content: "\f14c"; } .fa-box-open::before { content: "\f49e"; } .fa-scroll::before { content: "\f70e"; } .fa-spa::before { content: "\f5bb"; } .fa-location-pin-lock::before { content: "\e51f"; } .fa-pause::before { content: "\f04c"; } .fa-hill-avalanche::before { content: "\e507"; } .fa-temperature-empty::before { content: "\f2cb"; } .fa-temperature-0::before { content: "\f2cb"; } .fa-thermometer-0::before { content: "\f2cb"; } .fa-thermometer-empty::before { content: "\f2cb"; } .fa-bomb::before { content: "\f1e2"; } .fa-registered::before { content: "\f25d"; } .fa-address-card::before { content: "\f2bb"; } .fa-contact-card::before { content: "\f2bb"; } .fa-vcard::before { content: "\f2bb"; } .fa-scale-unbalanced-flip::before { content: "\f516"; } .fa-balance-scale-right::before { content: "\f516"; } .fa-subscript::before { content: "\f12c"; } .fa-diamond-turn-right::before { content: "\f5eb"; } .fa-directions::before { content: "\f5eb"; } .fa-burst::before { content: "\e4dc"; } .fa-house-laptop::before { content: "\e066"; } .fa-laptop-house::before { content: "\e066"; } .fa-face-tired::before { content: "\f5c8"; } .fa-tired::before { content: "\f5c8"; } .fa-money-bills::before { content: "\e1f3"; } .fa-smog::before { content: "\f75f"; } .fa-crutch::before { content: "\f7f7"; } .fa-cloud-arrow-up::before { content: "\f0ee"; } .fa-cloud-upload::before { content: "\f0ee"; } .fa-cloud-upload-alt::before { content: "\f0ee"; } .fa-palette::before { content: "\f53f"; } .fa-arrows-turn-right::before { content: "\e4c0"; } .fa-vest::before { content: "\e085"; } .fa-ferry::before { content: "\e4ea"; } .fa-arrows-down-to-people::before { content: "\e4b9"; } .fa-seedling::before { content: "\f4d8"; } .fa-sprout::before { content: "\f4d8"; } .fa-left-right::before { content: "\f337"; } .fa-arrows-alt-h::before { content: "\f337"; } .fa-boxes-packing::before { content: "\e4c7"; } .fa-circle-arrow-left::before { content: "\f0a8"; } .fa-arrow-circle-left::before { content: "\f0a8"; } .fa-group-arrows-rotate::before { content: "\e4f6"; } .fa-bowl-food::before { content: "\e4c6"; } .fa-candy-cane::before { content: "\f786"; } .fa-arrow-down-wide-short::before { content: "\f160"; } .fa-sort-amount-asc::before { content: "\f160"; } .fa-sort-amount-down::before { content: "\f160"; } .fa-cloud-bolt::before { content: "\f76c"; } .fa-thunderstorm::before { content: "\f76c"; } .fa-text-slash::before { content: "\f87d"; } .fa-remove-format::before { content: "\f87d"; } .fa-face-smile-wink::before { content: "\f4da"; } .fa-smile-wink::before { content: "\f4da"; } .fa-file-word::before { content: "\f1c2"; } .fa-file-powerpoint::before { content: "\f1c4"; } .fa-arrows-left-right::before { content: "\f07e"; } .fa-arrows-h::before { content: "\f07e"; } .fa-house-lock::before { content: "\e510"; } .fa-cloud-arrow-down::before { content: "\f0ed"; } .fa-cloud-download::before { content: "\f0ed"; } .fa-cloud-download-alt::before { content: "\f0ed"; } .fa-children::before { content: "\e4e1"; } .fa-chalkboard::before { content: "\f51b"; } .fa-blackboard::before { content: "\f51b"; } .fa-user-large-slash::before { content: "\f4fa"; } .fa-user-alt-slash::before { content: "\f4fa"; } .fa-envelope-open::before { content: "\f2b6"; } .fa-handshake-simple-slash::before { content: "\e05f"; } .fa-handshake-alt-slash::before { content: "\e05f"; } .fa-mattress-pillow::before { content: "\e525"; } .fa-guarani-sign::before { content: "\e19a"; } .fa-arrows-rotate::before { content: "\f021"; } .fa-refresh::before { content: "\f021"; } .fa-sync::before { content: "\f021"; } .fa-fire-extinguisher::before { content: "\f134"; } .fa-cruzeiro-sign::before { content: "\e152"; } .fa-greater-than-equal::before { content: "\f532"; } .fa-shield-halved::before { content: "\f3ed"; } .fa-shield-alt::before { content: "\f3ed"; } .fa-book-atlas::before { content: "\f558"; } .fa-atlas::before { content: "\f558"; } .fa-virus::before { content: "\e074"; } .fa-envelope-circle-check::before { content: "\e4e8"; } .fa-layer-group::before { content: "\f5fd"; } .fa-arrows-to-dot::before { content: "\e4be"; } .fa-archway::before { content: "\f557"; } .fa-heart-circle-check::before { content: "\e4fd"; } .fa-house-chimney-crack::before { content: "\f6f1"; } .fa-house-damage::before { content: "\f6f1"; } .fa-file-zipper::before { content: "\f1c6"; } .fa-file-archive::before { content: "\f1c6"; } .fa-square::before { content: "\f0c8"; } .fa-martini-glass-empty::before { content: "\f000"; } .fa-glass-martini::before { content: "\f000"; } .fa-couch::before { content: "\f4b8"; } .fa-cedi-sign::before { content: "\e0df"; } .fa-italic::before { content: "\f033"; } .fa-table-cells-column-lock::before { content: "\e678"; } .fa-church::before { content: "\f51d"; } .fa-comments-dollar::before { content: "\f653"; } .fa-democrat::before { content: "\f747"; } .fa-z::before { content: "\5a"; } .fa-person-skiing::before { content: "\f7c9"; } .fa-skiing::before { content: "\f7c9"; } .fa-road-lock::before { content: "\e567"; } .fa-a::before { content: "\41"; } .fa-temperature-arrow-down::before { content: "\e03f"; } .fa-temperature-down::before { content: "\e03f"; } .fa-feather-pointed::before { content: "\f56b"; } .fa-feather-alt::before { content: "\f56b"; } .fa-p::before { content: "\50"; } .fa-snowflake::before { content: "\f2dc"; } .fa-newspaper::before { content: "\f1ea"; } .fa-rectangle-ad::before { content: "\f641"; } .fa-ad::before { content: "\f641"; } .fa-circle-arrow-right::before { content: "\f0a9"; } .fa-arrow-circle-right::before { content: "\f0a9"; } .fa-filter-circle-xmark::before { content: "\e17b"; } .fa-locust::before { content: "\e520"; } .fa-sort::before { content: "\f0dc"; } .fa-unsorted::before { content: "\f0dc"; } .fa-list-ol::before { content: "\f0cb"; } .fa-list-1-2::before { content: "\f0cb"; } .fa-list-numeric::before { content: "\f0cb"; } .fa-person-dress-burst::before { content: "\e544"; } .fa-money-check-dollar::before { content: "\f53d"; } .fa-money-check-alt::before { content: "\f53d"; } .fa-vector-square::before { content: "\f5cb"; } .fa-bread-slice::before { content: "\f7ec"; } .fa-language::before { content: "\f1ab"; } .fa-face-kiss-wink-heart::before { content: "\f598"; } .fa-kiss-wink-heart::before { content: "\f598"; } .fa-filter::before { content: "\f0b0"; } .fa-question::before { content: "\3f"; } .fa-file-signature::before { content: "\f573"; } .fa-up-down-left-right::before { content: "\f0b2"; } .fa-arrows-alt::before { content: "\f0b2"; } .fa-house-chimney-user::before { content: "\e065"; } .fa-hand-holding-heart::before { content: "\f4be"; } .fa-puzzle-piece::before { content: "\f12e"; } .fa-money-check::before { content: "\f53c"; } .fa-star-half-stroke::before { content: "\f5c0"; } .fa-star-half-alt::before { content: "\f5c0"; } .fa-code::before { content: "\f121"; } .fa-whiskey-glass::before { content: "\f7a0"; } .fa-glass-whiskey::before { content: "\f7a0"; } .fa-building-circle-exclamation::before { content: "\e4d3"; } .fa-magnifying-glass-chart::before { content: "\e522"; } .fa-arrow-up-right-from-square::before { content: "\f08e"; } .fa-external-link::before { content: "\f08e"; } .fa-cubes-stacked::before { content: "\e4e6"; } .fa-won-sign::before { content: "\f159"; } .fa-krw::before { content: "\f159"; } .fa-won::before { content: "\f159"; } .fa-virus-covid::before { content: "\e4a8"; } .fa-austral-sign::before { content: "\e0a9"; } .fa-f::before { content: "\46"; } .fa-leaf::before { content: "\f06c"; } .fa-road::before { content: "\f018"; } .fa-taxi::before { content: "\f1ba"; } .fa-cab::before { content: "\f1ba"; } .fa-person-circle-plus::before { content: "\e541"; } .fa-chart-pie::before { content: "\f200"; } .fa-pie-chart::before { content: "\f200"; } .fa-bolt-lightning::before { content: "\e0b7"; } .fa-sack-xmark::before { content: "\e56a"; } .fa-file-excel::before { content: "\f1c3"; } .fa-file-contract::before { content: "\f56c"; } .fa-fish-fins::before { content: "\e4f2"; } .fa-building-flag::before { content: "\e4d5"; } .fa-face-grin-beam::before { content: "\f582"; } .fa-grin-beam::before { content: "\f582"; } .fa-object-ungroup::before { content: "\f248"; } .fa-poop::before { content: "\f619"; } .fa-location-pin::before { content: "\f041"; } .fa-map-marker::before { content: "\f041"; } .fa-kaaba::before { content: "\f66b"; } .fa-toilet-paper::before { content: "\f71e"; } .fa-helmet-safety::before { content: "\f807"; } .fa-hard-hat::before { content: "\f807"; } .fa-hat-hard::before { content: "\f807"; } .fa-eject::before { content: "\f052"; } .fa-circle-right::before { content: "\f35a"; } .fa-arrow-alt-circle-right::before { content: "\f35a"; } .fa-plane-circle-check::before { content: "\e555"; } .fa-face-rolling-eyes::before { content: "\f5a5"; } .fa-meh-rolling-eyes::before { content: "\f5a5"; } .fa-object-group::before { content: "\f247"; } .fa-chart-line::before { content: "\f201"; } .fa-line-chart::before { content: "\f201"; } .fa-mask-ventilator::before { content: "\e524"; } .fa-arrow-right::before { content: "\f061"; } .fa-signs-post::before { content: "\f277"; } .fa-map-signs::before { content: "\f277"; } .fa-cash-register::before { content: "\f788"; } .fa-person-circle-question::before { content: "\e542"; } .fa-h::before { content: "\48"; } .fa-tarp::before { content: "\e57b"; } .fa-screwdriver-wrench::before { content: "\f7d9"; } .fa-tools::before { content: "\f7d9"; } .fa-arrows-to-eye::before { content: "\e4bf"; } .fa-plug-circle-bolt::before { content: "\e55b"; } .fa-heart::before { content: "\f004"; } .fa-mars-and-venus::before { content: "\f224"; } .fa-house-user::before { content: "\e1b0"; } .fa-home-user::before { content: "\e1b0"; } .fa-dumpster-fire::before { content: "\f794"; } .fa-house-crack::before { content: "\e3b1"; } .fa-martini-glass-citrus::before { content: "\f561"; } .fa-cocktail::before { content: "\f561"; } .fa-face-surprise::before { content: "\f5c2"; } .fa-surprise::before { content: "\f5c2"; } .fa-bottle-water::before { content: "\e4c5"; } .fa-circle-pause::before { content: "\f28b"; } .fa-pause-circle::before { content: "\f28b"; } .fa-toilet-paper-slash::before { content: "\e072"; } .fa-apple-whole::before { content: "\f5d1"; } .fa-apple-alt::before { content: "\f5d1"; } .fa-kitchen-set::before { content: "\e51a"; } .fa-r::before { content: "\52"; } .fa-temperature-quarter::before { content: "\f2ca"; } .fa-temperature-1::before { content: "\f2ca"; } .fa-thermometer-1::before { content: "\f2ca"; } .fa-thermometer-quarter::before { content: "\f2ca"; } .fa-cube::before { content: "\f1b2"; } .fa-bitcoin-sign::before { content: "\e0b4"; } .fa-shield-dog::before { content: "\e573"; } .fa-solar-panel::before { content: "\f5ba"; } .fa-lock-open::before { content: "\f3c1"; } .fa-elevator::before { content: "\e16d"; } .fa-money-bill-transfer::before { content: "\e528"; } .fa-money-bill-trend-up::before { content: "\e529"; } .fa-house-flood-water-circle-arrow-right::before { content: "\e50f"; } .fa-square-poll-horizontal::before { content: "\f682"; } .fa-poll-h::before { content: "\f682"; } .fa-circle::before { content: "\f111"; } .fa-backward-fast::before { content: "\f049"; } .fa-fast-backward::before { content: "\f049"; } .fa-recycle::before { content: "\f1b8"; } .fa-user-astronaut::before { content: "\f4fb"; } .fa-plane-slash::before { content: "\e069"; } .fa-trademark::before { content: "\f25c"; } .fa-basketball::before { content: "\f434"; } .fa-basketball-ball::before { content: "\f434"; } .fa-satellite-dish::before { content: "\f7c0"; } .fa-circle-up::before { content: "\f35b"; } .fa-arrow-alt-circle-up::before { content: "\f35b"; } .fa-mobile-screen-button::before { content: "\f3cd"; } .fa-mobile-alt::before { content: "\f3cd"; } .fa-volume-high::before { content: "\f028"; } .fa-volume-up::before { content: "\f028"; } .fa-users-rays::before { content: "\e593"; } .fa-wallet::before { content: "\f555"; } .fa-clipboard-check::before { content: "\f46c"; } .fa-file-audio::before { content: "\f1c7"; } .fa-burger::before { content: "\f805"; } .fa-hamburger::before { content: "\f805"; } .fa-wrench::before { content: "\f0ad"; } .fa-bugs::before { content: "\e4d0"; } .fa-rupee-sign::before { content: "\f156"; } .fa-rupee::before { content: "\f156"; } .fa-file-image::before { content: "\f1c5"; } .fa-circle-question::before { content: "\f059"; } .fa-question-circle::before { content: "\f059"; } .fa-plane-departure::before { content: "\f5b0"; } .fa-handshake-slash::before { content: "\e060"; } .fa-book-bookmark::before { content: "\e0bb"; } .fa-code-branch::before { content: "\f126"; } .fa-hat-cowboy::before { content: "\f8c0"; } .fa-bridge::before { content: "\e4c8"; } .fa-phone-flip::before { content: "\f879"; } .fa-phone-alt::before { content: "\f879"; } .fa-truck-front::before { content: "\e2b7"; } .fa-cat::before { content: "\f6be"; } .fa-anchor-circle-exclamation::before { content: "\e4ab"; } .fa-truck-field::before { content: "\e58d"; } .fa-route::before { content: "\f4d7"; } .fa-clipboard-question::before { content: "\e4e3"; } .fa-panorama::before { content: "\e209"; } .fa-comment-medical::before { content: "\f7f5"; } .fa-teeth-open::before { content: "\f62f"; } .fa-file-circle-minus::before { content: "\e4ed"; } .fa-tags::before { content: "\f02c"; } .fa-wine-glass::before { content: "\f4e3"; } .fa-forward-fast::before { content: "\f050"; } .fa-fast-forward::before { content: "\f050"; } .fa-face-meh-blank::before { content: "\f5a4"; } .fa-meh-blank::before { content: "\f5a4"; } .fa-square-parking::before { content: "\f540"; } .fa-parking::before { content: "\f540"; } .fa-house-signal::before { content: "\e012"; } .fa-bars-progress::before { content: "\f828"; } .fa-tasks-alt::before { content: "\f828"; } .fa-faucet-drip::before { content: "\e006"; } .fa-cart-flatbed::before { content: "\f474"; } .fa-dolly-flatbed::before { content: "\f474"; } .fa-ban-smoking::before { content: "\f54d"; } .fa-smoking-ban::before { content: "\f54d"; } .fa-terminal::before { content: "\f120"; } .fa-mobile-button::before { content: "\f10b"; } .fa-house-medical-flag::before { content: "\e514"; } .fa-basket-shopping::before { content: "\f291"; } .fa-shopping-basket::before { content: "\f291"; } .fa-tape::before { content: "\f4db"; } .fa-bus-simple::before { content: "\f55e"; } .fa-bus-alt::before { content: "\f55e"; } .fa-eye::before { content: "\f06e"; } .fa-face-sad-cry::before { content: "\f5b3"; } .fa-sad-cry::before { content: "\f5b3"; } .fa-audio-description::before { content: "\f29e"; } .fa-person-military-to-person::before { content: "\e54c"; } .fa-file-shield::before { content: "\e4f0"; } .fa-user-slash::before { content: "\f506"; } .fa-pen::before { content: "\f304"; } .fa-tower-observation::before { content: "\e586"; } .fa-file-code::before { content: "\f1c9"; } .fa-signal::before { content: "\f012"; } .fa-signal-5::before { content: "\f012"; } .fa-signal-perfect::before { content: "\f012"; } .fa-bus::before { content: "\f207"; } .fa-heart-circle-xmark::before { content: "\e501"; } .fa-house-chimney::before { content: "\e3af"; } .fa-home-lg::before { content: "\e3af"; } .fa-window-maximize::before { content: "\f2d0"; } .fa-face-frown::before { content: "\f119"; } .fa-frown::before { content: "\f119"; } .fa-prescription::before { content: "\f5b1"; } .fa-shop::before { content: "\f54f"; } .fa-store-alt::before { content: "\f54f"; } .fa-floppy-disk::before { content: "\f0c7"; } .fa-save::before { content: "\f0c7"; } .fa-vihara::before { content: "\f6a7"; } .fa-scale-unbalanced::before { content: "\f515"; } .fa-balance-scale-left::before { content: "\f515"; } .fa-sort-up::before { content: "\f0de"; } .fa-sort-asc::before { content: "\f0de"; } .fa-comment-dots::before { content: "\f4ad"; } .fa-commenting::before { content: "\f4ad"; } .fa-plant-wilt::before { content: "\e5aa"; } .fa-diamond::before { content: "\f219"; } .fa-face-grin-squint::before { content: "\f585"; } .fa-grin-squint::before { content: "\f585"; } .fa-hand-holding-dollar::before { content: "\f4c0"; } .fa-hand-holding-usd::before { content: "\f4c0"; } .fa-bacterium::before { content: "\e05a"; } .fa-hand-pointer::before { content: "\f25a"; } .fa-drum-steelpan::before { content: "\f56a"; } .fa-hand-scissors::before { content: "\f257"; } .fa-hands-praying::before { content: "\f684"; } .fa-praying-hands::before { content: "\f684"; } .fa-arrow-rotate-right::before { content: "\f01e"; } .fa-arrow-right-rotate::before { content: "\f01e"; } .fa-arrow-rotate-forward::before { content: "\f01e"; } .fa-redo::before { content: "\f01e"; } .fa-biohazard::before { content: "\f780"; } .fa-location-crosshairs::before { content: "\f601"; } .fa-location::before { content: "\f601"; } .fa-mars-double::before { content: "\f227"; } .fa-child-dress::before { content: "\e59c"; } .fa-users-between-lines::before { content: "\e591"; } .fa-lungs-virus::before { content: "\e067"; } .fa-face-grin-tears::before { content: "\f588"; } .fa-grin-tears::before { content: "\f588"; } .fa-phone::before { content: "\f095"; } .fa-calendar-xmark::before { content: "\f273"; } .fa-calendar-times::before { content: "\f273"; } .fa-child-reaching::before { content: "\e59d"; } .fa-head-side-virus::before { content: "\e064"; } .fa-user-gear::before { content: "\f4fe"; } .fa-user-cog::before { content: "\f4fe"; } .fa-arrow-up-1-9::before { content: "\f163"; } .fa-sort-numeric-up::before { content: "\f163"; } .fa-door-closed::before { content: "\f52a"; } .fa-shield-virus::before { content: "\e06c"; } .fa-dice-six::before { content: "\f526"; } .fa-mosquito-net::before { content: "\e52c"; } .fa-bridge-water::before { content: "\e4ce"; } .fa-person-booth::before { content: "\f756"; } .fa-text-width::before { content: "\f035"; } .fa-hat-wizard::before { content: "\f6e8"; } .fa-pen-fancy::before { content: "\f5ac"; } .fa-person-digging::before { content: "\f85e"; } .fa-digging::before { content: "\f85e"; } .fa-trash::before { content: "\f1f8"; } .fa-gauge-simple::before { content: "\f629"; } .fa-gauge-simple-med::before { content: "\f629"; } .fa-tachometer-average::before { content: "\f629"; } .fa-book-medical::before { content: "\f7e6"; } .fa-poo::before { content: "\f2fe"; } .fa-quote-right::before { content: "\f10e"; } .fa-quote-right-alt::before { content: "\f10e"; } .fa-shirt::before { content: "\f553"; } .fa-t-shirt::before { content: "\f553"; } .fa-tshirt::before { content: "\f553"; } .fa-cubes::before { content: "\f1b3"; } .fa-divide::before { content: "\f529"; } .fa-tenge-sign::before { content: "\f7d7"; } .fa-tenge::before { content: "\f7d7"; } .fa-headphones::before { content: "\f025"; } .fa-hands-holding::before { content: "\f4c2"; } .fa-hands-clapping::before { content: "\e1a8"; } .fa-republican::before { content: "\f75e"; } .fa-arrow-left::before { content: "\f060"; } .fa-person-circle-xmark::before { content: "\e543"; } .fa-ruler::before { content: "\f545"; } .fa-align-left::before { content: "\f036"; } .fa-dice-d6::before { content: "\f6d1"; } .fa-restroom::before { content: "\f7bd"; } .fa-j::before { content: "\4a"; } .fa-users-viewfinder::before { content: "\e595"; } .fa-file-video::before { content: "\f1c8"; } .fa-up-right-from-square::before { content: "\f35d"; } .fa-external-link-alt::before { content: "\f35d"; } .fa-table-cells::before { content: "\f00a"; } .fa-th::before { content: "\f00a"; } .fa-file-pdf::before { content: "\f1c1"; } .fa-book-bible::before { content: "\f647"; } .fa-bible::before { content: "\f647"; } .fa-o::before { content: "\4f"; } .fa-suitcase-medical::before { content: "\f0fa"; } .fa-medkit::before { content: "\f0fa"; } .fa-user-secret::before { content: "\f21b"; } .fa-otter::before { content: "\f700"; } .fa-person-dress::before { content: "\f182"; } .fa-female::before { content: "\f182"; } .fa-comment-dollar::before { content: "\f651"; } .fa-business-time::before { content: "\f64a"; } .fa-briefcase-clock::before { content: "\f64a"; } .fa-table-cells-large::before { content: "\f009"; } .fa-th-large::before { content: "\f009"; } .fa-book-tanakh::before { content: "\f827"; } .fa-tanakh::before { content: "\f827"; } .fa-phone-volume::before { content: "\f2a0"; } .fa-volume-control-phone::before { content: "\f2a0"; } .fa-hat-cowboy-side::before { content: "\f8c1"; } .fa-clipboard-user::before { content: "\f7f3"; } .fa-child::before { content: "\f1ae"; } .fa-lira-sign::before { content: "\f195"; } .fa-satellite::before { content: "\f7bf"; } .fa-plane-lock::before { content: "\e558"; } .fa-tag::before { content: "\f02b"; } .fa-comment::before { content: "\f075"; } .fa-cake-candles::before { content: "\f1fd"; } .fa-birthday-cake::before { content: "\f1fd"; } .fa-cake::before { content: "\f1fd"; } .fa-envelope::before { content: "\f0e0"; } .fa-angles-up::before { content: "\f102"; } .fa-angle-double-up::before { content: "\f102"; } .fa-paperclip::before { content: "\f0c6"; } .fa-arrow-right-to-city::before { content: "\e4b3"; } .fa-ribbon::before { content: "\f4d6"; } .fa-lungs::before { content: "\f604"; } .fa-arrow-up-9-1::before { content: "\f887"; } .fa-sort-numeric-up-alt::before { content: "\f887"; } .fa-litecoin-sign::before { content: "\e1d3"; } .fa-border-none::before { content: "\f850"; } .fa-circle-nodes::before { content: "\e4e2"; } .fa-parachute-box::before { content: "\f4cd"; } .fa-indent::before { content: "\f03c"; } .fa-truck-field-un::before { content: "\e58e"; } .fa-hourglass::before { content: "\f254"; } .fa-hourglass-empty::before { content: "\f254"; } .fa-mountain::before { content: "\f6fc"; } .fa-user-doctor::before { content: "\f0f0"; } .fa-user-md::before { content: "\f0f0"; } .fa-circle-info::before { content: "\f05a"; } .fa-info-circle::before { content: "\f05a"; } .fa-cloud-meatball::before { content: "\f73b"; } .fa-camera::before { content: "\f030"; } .fa-camera-alt::before { content: "\f030"; } .fa-square-virus::before { content: "\e578"; } .fa-meteor::before { content: "\f753"; } .fa-car-on::before { content: "\e4dd"; } .fa-sleigh::before { content: "\f7cc"; } .fa-arrow-down-1-9::before { content: "\f162"; } .fa-sort-numeric-asc::before { content: "\f162"; } .fa-sort-numeric-down::before { content: "\f162"; } .fa-hand-holding-droplet::before { content: "\f4c1"; } .fa-hand-holding-water::before { content: "\f4c1"; } .fa-water::before { content: "\f773"; } .fa-calendar-check::before { content: "\f274"; } .fa-braille::before { content: "\f2a1"; } .fa-prescription-bottle-medical::before { content: "\f486"; } .fa-prescription-bottle-alt::before { content: "\f486"; } .fa-landmark::before { content: "\f66f"; } .fa-truck::before { content: "\f0d1"; } .fa-crosshairs::before { content: "\f05b"; } .fa-person-cane::before { content: "\e53c"; } .fa-tent::before { content: "\e57d"; } .fa-vest-patches::before { content: "\e086"; } .fa-check-double::before { content: "\f560"; } .fa-arrow-down-a-z::before { content: "\f15d"; } .fa-sort-alpha-asc::before { content: "\f15d"; } .fa-sort-alpha-down::before { content: "\f15d"; } .fa-money-bill-wheat::before { content: "\e52a"; } .fa-cookie::before { content: "\f563"; } .fa-arrow-rotate-left::before { content: "\f0e2"; } .fa-arrow-left-rotate::before { content: "\f0e2"; } .fa-arrow-rotate-back::before { content: "\f0e2"; } .fa-arrow-rotate-backward::before { content: "\f0e2"; } .fa-undo::before { content: "\f0e2"; } .fa-hard-drive::before { content: "\f0a0"; } .fa-hdd::before { content: "\f0a0"; } .fa-face-grin-squint-tears::before { content: "\f586"; } .fa-grin-squint-tears::before { content: "\f586"; } .fa-dumbbell::before { content: "\f44b"; } .fa-rectangle-list::before { content: "\f022"; } .fa-list-alt::before { content: "\f022"; } .fa-tarp-droplet::before { content: "\e57c"; } .fa-house-medical-circle-check::before { content: "\e511"; } .fa-person-skiing-nordic::before { content: "\f7ca"; } .fa-skiing-nordic::before { content: "\f7ca"; } .fa-calendar-plus::before { content: "\f271"; } .fa-plane-arrival::before { content: "\f5af"; } .fa-circle-left::before { content: "\f359"; } .fa-arrow-alt-circle-left::before { content: "\f359"; } .fa-train-subway::before { content: "\f239"; } .fa-subway::before { content: "\f239"; } .fa-chart-gantt::before { content: "\e0e4"; } .fa-indian-rupee-sign::before { content: "\e1bc"; } .fa-indian-rupee::before { content: "\e1bc"; } .fa-inr::before { content: "\e1bc"; } .fa-crop-simple::before { content: "\f565"; } .fa-crop-alt::before { content: "\f565"; } .fa-money-bill-1::before { content: "\f3d1"; } .fa-money-bill-alt::before { content: "\f3d1"; } .fa-left-long::before { content: "\f30a"; } .fa-long-arrow-alt-left::before { content: "\f30a"; } .fa-dna::before { content: "\f471"; } .fa-virus-slash::before { content: "\e075"; } .fa-minus::before { content: "\f068"; } .fa-subtract::before { content: "\f068"; } .fa-chess::before { content: "\f439"; } .fa-arrow-left-long::before { content: "\f177"; } .fa-long-arrow-left::before { content: "\f177"; } .fa-plug-circle-check::before { content: "\e55c"; } .fa-street-view::before { content: "\f21d"; } .fa-franc-sign::before { content: "\e18f"; } .fa-volume-off::before { content: "\f026"; } .fa-hands-asl-interpreting::before { content: "\f2a3"; } .fa-american-sign-language-interpreting::before { content: "\f2a3"; } .fa-asl-interpreting::before { content: "\f2a3"; } .fa-hands-american-sign-language-interpreting::before { content: "\f2a3"; } .fa-gear::before { content: "\f013"; } .fa-cog::before { content: "\f013"; } .fa-droplet-slash::before { content: "\f5c7"; } .fa-tint-slash::before { content: "\f5c7"; } .fa-mosque::before { content: "\f678"; } .fa-mosquito::before { content: "\e52b"; } .fa-star-of-david::before { content: "\f69a"; } .fa-person-military-rifle::before { content: "\e54b"; } .fa-cart-shopping::before { content: "\f07a"; } .fa-shopping-cart::before { content: "\f07a"; } .fa-vials::before { content: "\f493"; } .fa-plug-circle-plus::before { content: "\e55f"; } .fa-place-of-worship::before { content: "\f67f"; } .fa-grip-vertical::before { content: "\f58e"; } .fa-arrow-turn-up::before { content: "\f148"; } .fa-level-up::before { content: "\f148"; } .fa-u::before { content: "\55"; } .fa-square-root-variable::before { content: "\f698"; } .fa-square-root-alt::before { content: "\f698"; } .fa-clock::before { content: "\f017"; } .fa-clock-four::before { content: "\f017"; } .fa-backward-step::before { content: "\f048"; } .fa-step-backward::before { content: "\f048"; } .fa-pallet::before { content: "\f482"; } .fa-faucet::before { content: "\e005"; } .fa-baseball-bat-ball::before { content: "\f432"; } .fa-s::before { content: "\53"; } .fa-timeline::before { content: "\e29c"; } .fa-keyboard::before { content: "\f11c"; } .fa-caret-down::before { content: "\f0d7"; } .fa-house-chimney-medical::before { content: "\f7f2"; } .fa-clinic-medical::before { content: "\f7f2"; } .fa-temperature-three-quarters::before { content: "\f2c8"; } .fa-temperature-3::before { content: "\f2c8"; } .fa-thermometer-3::before { content: "\f2c8"; } .fa-thermometer-three-quarters::before { content: "\f2c8"; } .fa-mobile-screen::before { content: "\f3cf"; } .fa-mobile-android-alt::before { content: "\f3cf"; } .fa-plane-up::before { content: "\e22d"; } .fa-piggy-bank::before { content: "\f4d3"; } .fa-battery-half::before { content: "\f242"; } .fa-battery-3::before { content: "\f242"; } .fa-mountain-city::before { content: "\e52e"; } .fa-coins::before { content: "\f51e"; } .fa-khanda::before { content: "\f66d"; } .fa-sliders::before { content: "\f1de"; } .fa-sliders-h::before { content: "\f1de"; } .fa-folder-tree::before { content: "\f802"; } .fa-network-wired::before { content: "\f6ff"; } .fa-map-pin::before { content: "\f276"; } .fa-hamsa::before { content: "\f665"; } .fa-cent-sign::before { content: "\e3f5"; } .fa-flask::before { content: "\f0c3"; } .fa-person-pregnant::before { content: "\e31e"; } .fa-wand-sparkles::before { content: "\f72b"; } .fa-ellipsis-vertical::before { content: "\f142"; } .fa-ellipsis-v::before { content: "\f142"; } .fa-ticket::before { content: "\f145"; } .fa-power-off::before { content: "\f011"; } .fa-right-long::before { content: "\f30b"; } .fa-long-arrow-alt-right::before { content: "\f30b"; } .fa-flag-usa::before { content: "\f74d"; } .fa-laptop-file::before { content: "\e51d"; } .fa-tty::before { content: "\f1e4"; } .fa-teletype::before { content: "\f1e4"; } .fa-diagram-next::before { content: "\e476"; } .fa-person-rifle::before { content: "\e54e"; } .fa-house-medical-circle-exclamation::before { content: "\e512"; } .fa-closed-captioning::before { content: "\f20a"; } .fa-person-hiking::before { content: "\f6ec"; } .fa-hiking::before { content: "\f6ec"; } .fa-venus-double::before { content: "\f226"; } .fa-images::before { content: "\f302"; } .fa-calculator::before { content: "\f1ec"; } .fa-people-pulling::before { content: "\e535"; } .fa-n::before { content: "\4e"; } .fa-cable-car::before { content: "\f7da"; } .fa-tram::before { content: "\f7da"; } .fa-cloud-rain::before { content: "\f73d"; } .fa-building-circle-xmark::before { content: "\e4d4"; } .fa-ship::before { content: "\f21a"; } .fa-arrows-down-to-line::before { content: "\e4b8"; } .fa-download::before { content: "\f019"; } .fa-face-grin::before { content: "\f580"; } .fa-grin::before { content: "\f580"; } .fa-delete-left::before { content: "\f55a"; } .fa-backspace::before { content: "\f55a"; } .fa-eye-dropper::before { content: "\f1fb"; } .fa-eye-dropper-empty::before { content: "\f1fb"; } .fa-eyedropper::before { content: "\f1fb"; } .fa-file-circle-check::before { content: "\e5a0"; } .fa-forward::before { content: "\f04e"; } .fa-mobile::before { content: "\f3ce"; } .fa-mobile-android::before { content: "\f3ce"; } .fa-mobile-phone::before { content: "\f3ce"; } .fa-face-meh::before { content: "\f11a"; } .fa-meh::before { content: "\f11a"; } .fa-align-center::before { content: "\f037"; } .fa-book-skull::before { content: "\f6b7"; } .fa-book-dead::before { content: "\f6b7"; } .fa-id-card::before { content: "\f2c2"; } .fa-drivers-license::before { content: "\f2c2"; } .fa-outdent::before { content: "\f03b"; } .fa-dedent::before { content: "\f03b"; } .fa-heart-circle-exclamation::before { content: "\e4fe"; } .fa-house::before { content: "\f015"; } .fa-home::before { content: "\f015"; } .fa-home-alt::before { content: "\f015"; } .fa-home-lg-alt::before { content: "\f015"; } .fa-calendar-week::before { content: "\f784"; } .fa-laptop-medical::before { content: "\f812"; } .fa-b::before { content: "\42"; } .fa-file-medical::before { content: "\f477"; } .fa-dice-one::before { content: "\f525"; } .fa-kiwi-bird::before { content: "\f535"; } .fa-arrow-right-arrow-left::before { content: "\f0ec"; } .fa-exchange::before { content: "\f0ec"; } .fa-rotate-right::before { content: "\f2f9"; } .fa-redo-alt::before { content: "\f2f9"; } .fa-rotate-forward::before { content: "\f2f9"; } .fa-utensils::before { content: "\f2e7"; } .fa-cutlery::before { content: "\f2e7"; } .fa-arrow-up-wide-short::before { content: "\f161"; } .fa-sort-amount-up::before { content: "\f161"; } .fa-mill-sign::before { content: "\e1ed"; } .fa-bowl-rice::before { content: "\e2eb"; } .fa-skull::before { content: "\f54c"; } .fa-tower-broadcast::before { content: "\f519"; } .fa-broadcast-tower::before { content: "\f519"; } .fa-truck-pickup::before { content: "\f63c"; } .fa-up-long::before { content: "\f30c"; } .fa-long-arrow-alt-up::before { content: "\f30c"; } .fa-stop::before { content: "\f04d"; } .fa-code-merge::before { content: "\f387"; } .fa-upload::before { content: "\f093"; } .fa-hurricane::before { content: "\f751"; } .fa-mound::before { content: "\e52d"; } .fa-toilet-portable::before { content: "\e583"; } .fa-compact-disc::before { content: "\f51f"; } .fa-file-arrow-down::before { content: "\f56d"; } .fa-file-download::before { content: "\f56d"; } .fa-caravan::before { content: "\f8ff"; } .fa-shield-cat::before { content: "\e572"; } .fa-bolt::before { content: "\f0e7"; } .fa-zap::before { content: "\f0e7"; } .fa-glass-water::before { content: "\e4f4"; } .fa-oil-well::before { content: "\e532"; } .fa-vault::before { content: "\e2c5"; } .fa-mars::before { content: "\f222"; } .fa-toilet::before { content: "\f7d8"; } .fa-plane-circle-xmark::before { content: "\e557"; } .fa-yen-sign::before { content: "\f157"; } .fa-cny::before { content: "\f157"; } .fa-jpy::before { content: "\f157"; } .fa-rmb::before { content: "\f157"; } .fa-yen::before { content: "\f157"; } .fa-ruble-sign::before { content: "\f158"; } .fa-rouble::before { content: "\f158"; } .fa-rub::before { content: "\f158"; } .fa-ruble::before { content: "\f158"; } .fa-sun::before { content: "\f185"; } .fa-guitar::before { content: "\f7a6"; } .fa-face-laugh-wink::before { content: "\f59c"; } .fa-laugh-wink::before { content: "\f59c"; } .fa-horse-head::before { content: "\f7ab"; } .fa-bore-hole::before { content: "\e4c3"; } .fa-industry::before { content: "\f275"; } .fa-circle-down::before { content: "\f358"; } .fa-arrow-alt-circle-down::before { content: "\f358"; } .fa-arrows-turn-to-dots::before { content: "\e4c1"; } .fa-florin-sign::before { content: "\e184"; } .fa-arrow-down-short-wide::before { content: "\f884"; } .fa-sort-amount-desc::before { content: "\f884"; } .fa-sort-amount-down-alt::before { content: "\f884"; } .fa-less-than::before { content: "\3c"; } .fa-angle-down::before { content: "\f107"; } .fa-car-tunnel::before { content: "\e4de"; } .fa-head-side-cough::before { content: "\e061"; } .fa-grip-lines::before { content: "\f7a4"; } .fa-thumbs-down::before { content: "\f165"; } .fa-user-lock::before { content: "\f502"; } .fa-arrow-right-long::before { content: "\f178"; } .fa-long-arrow-right::before { content: "\f178"; } .fa-anchor-circle-xmark::before { content: "\e4ac"; } .fa-ellipsis::before { content: "\f141"; } .fa-ellipsis-h::before { content: "\f141"; } .fa-chess-pawn::before { content: "\f443"; } .fa-kit-medical::before { content: "\f479"; } .fa-first-aid::before { content: "\f479"; } .fa-person-through-window::before { content: "\e5a9"; } .fa-toolbox::before { content: "\f552"; } .fa-hands-holding-circle::before { content: "\e4fb"; } .fa-bug::before { content: "\f188"; } .fa-credit-card::before { content: "\f09d"; } .fa-credit-card-alt::before { content: "\f09d"; } .fa-car::before { content: "\f1b9"; } .fa-automobile::before { content: "\f1b9"; } .fa-hand-holding-hand::before { content: "\e4f7"; } .fa-book-open-reader::before { content: "\f5da"; } .fa-book-reader::before { content: "\f5da"; } .fa-mountain-sun::before { content: "\e52f"; } .fa-arrows-left-right-to-line::before { content: "\e4ba"; } .fa-dice-d20::before { content: "\f6cf"; } .fa-truck-droplet::before { content: "\e58c"; } .fa-file-circle-xmark::before { content: "\e5a1"; } .fa-temperature-arrow-up::before { content: "\e040"; } .fa-temperature-up::before { content: "\e040"; } .fa-medal::before { content: "\f5a2"; } .fa-bed::before { content: "\f236"; } .fa-square-h::before { content: "\f0fd"; } .fa-h-square::before { content: "\f0fd"; } .fa-podcast::before { content: "\f2ce"; } .fa-temperature-full::before { content: "\f2c7"; } .fa-temperature-4::before { content: "\f2c7"; } .fa-thermometer-4::before { content: "\f2c7"; } .fa-thermometer-full::before { content: "\f2c7"; } .fa-bell::before { content: "\f0f3"; } .fa-superscript::before { content: "\f12b"; } .fa-plug-circle-xmark::before { content: "\e560"; } .fa-star-of-life::before { content: "\f621"; } .fa-phone-slash::before { content: "\f3dd"; } .fa-paint-roller::before { content: "\f5aa"; } .fa-handshake-angle::before { content: "\f4c4"; } .fa-hands-helping::before { content: "\f4c4"; } .fa-location-dot::before { content: "\f3c5"; } .fa-map-marker-alt::before { content: "\f3c5"; } .fa-file::before { content: "\f15b"; } .fa-greater-than::before { content: "\3e"; } .fa-person-swimming::before { content: "\f5c4"; } .fa-swimmer::before { content: "\f5c4"; } .fa-arrow-down::before { content: "\f063"; } .fa-droplet::before { content: "\f043"; } .fa-tint::before { content: "\f043"; } .fa-eraser::before { content: "\f12d"; } .fa-earth-americas::before { content: "\f57d"; } .fa-earth::before { content: "\f57d"; } .fa-earth-america::before { content: "\f57d"; } .fa-globe-americas::before { content: "\f57d"; } .fa-person-burst::before { content: "\e53b"; } .fa-dove::before { content: "\f4ba"; } .fa-battery-empty::before { content: "\f244"; } .fa-battery-0::before { content: "\f244"; } .fa-socks::before { content: "\f696"; } .fa-inbox::before { content: "\f01c"; } .fa-section::before { content: "\e447"; } .fa-gauge-high::before { content: "\f625"; } .fa-tachometer-alt::before { content: "\f625"; } .fa-tachometer-alt-fast::before { content: "\f625"; } .fa-envelope-open-text::before { content: "\f658"; } .fa-hospital::before { content: "\f0f8"; } .fa-hospital-alt::before { content: "\f0f8"; } .fa-hospital-wide::before { content: "\f0f8"; } .fa-wine-bottle::before { content: "\f72f"; } .fa-chess-rook::before { content: "\f447"; } .fa-bars-staggered::before { content: "\f550"; } .fa-reorder::before { content: "\f550"; } .fa-stream::before { content: "\f550"; } .fa-dharmachakra::before { content: "\f655"; } .fa-hotdog::before { content: "\f80f"; } .fa-person-walking-with-cane::before { content: "\f29d"; } .fa-blind::before { content: "\f29d"; } .fa-drum::before { content: "\f569"; } .fa-ice-cream::before { content: "\f810"; } .fa-heart-circle-bolt::before { content: "\e4fc"; } .fa-fax::before { content: "\f1ac"; } .fa-paragraph::before { content: "\f1dd"; } .fa-check-to-slot::before { content: "\f772"; } .fa-vote-yea::before { content: "\f772"; } .fa-star-half::before { content: "\f089"; } .fa-boxes-stacked::before { content: "\f468"; } .fa-boxes::before { content: "\f468"; } .fa-boxes-alt::before { content: "\f468"; } .fa-link::before { content: "\f0c1"; } .fa-chain::before { content: "\f0c1"; } .fa-ear-listen::before { content: "\f2a2"; } .fa-assistive-listening-systems::before { content: "\f2a2"; } .fa-tree-city::before { content: "\e587"; } .fa-play::before { content: "\f04b"; } .fa-font::before { content: "\f031"; } .fa-table-cells-row-lock::before { content: "\e67a"; } .fa-rupiah-sign::before { content: "\e23d"; } .fa-magnifying-glass::before { content: "\f002"; } .fa-search::before { content: "\f002"; } .fa-table-tennis-paddle-ball::before { content: "\f45d"; } .fa-ping-pong-paddle-ball::before { content: "\f45d"; } .fa-table-tennis::before { content: "\f45d"; } .fa-person-dots-from-line::before { content: "\f470"; } .fa-diagnoses::before { content: "\f470"; } .fa-trash-can-arrow-up::before { content: "\f82a"; } .fa-trash-restore-alt::before { content: "\f82a"; } .fa-naira-sign::before { content: "\e1f6"; } .fa-cart-arrow-down::before { content: "\f218"; } .fa-walkie-talkie::before { content: "\f8ef"; } .fa-file-pen::before { content: "\f31c"; } .fa-file-edit::before { content: "\f31c"; } .fa-receipt::before { content: "\f543"; } .fa-square-pen::before { content: "\f14b"; } .fa-pen-square::before { content: "\f14b"; } .fa-pencil-square::before { content: "\f14b"; } .fa-suitcase-rolling::before { content: "\f5c1"; } .fa-person-circle-exclamation::before { content: "\e53f"; } .fa-chevron-down::before { content: "\f078"; } .fa-battery-full::before { content: "\f240"; } .fa-battery::before { content: "\f240"; } .fa-battery-5::before { content: "\f240"; } .fa-skull-crossbones::before { content: "\f714"; } .fa-code-compare::before { content: "\e13a"; } .fa-list-ul::before { content: "\f0ca"; } .fa-list-dots::before { content: "\f0ca"; } .fa-school-lock::before { content: "\e56f"; } .fa-tower-cell::before { content: "\e585"; } .fa-down-long::before { content: "\f309"; } .fa-long-arrow-alt-down::before { content: "\f309"; } .fa-ranking-star::before { content: "\e561"; } .fa-chess-king::before { content: "\f43f"; } .fa-person-harassing::before { content: "\e549"; } .fa-brazilian-real-sign::before { content: "\e46c"; } .fa-landmark-dome::before { content: "\f752"; } .fa-landmark-alt::before { content: "\f752"; } .fa-arrow-up::before { content: "\f062"; } .fa-tv::before { content: "\f26c"; } .fa-television::before { content: "\f26c"; } .fa-tv-alt::before { content: "\f26c"; } .fa-shrimp::before { content: "\e448"; } .fa-list-check::before { content: "\f0ae"; } .fa-tasks::before { content: "\f0ae"; } .fa-jug-detergent::before { content: "\e519"; } .fa-circle-user::before { content: "\f2bd"; } .fa-user-circle::before { content: "\f2bd"; } .fa-user-shield::before { content: "\f505"; } .fa-wind::before { content: "\f72e"; } .fa-car-burst::before { content: "\f5e1"; } .fa-car-crash::before { content: "\f5e1"; } .fa-y::before { content: "\59"; } .fa-person-snowboarding::before { content: "\f7ce"; } .fa-snowboarding::before { content: "\f7ce"; } .fa-truck-fast::before { content: "\f48b"; } .fa-shipping-fast::before { content: "\f48b"; } .fa-fish::before { content: "\f578"; } .fa-user-graduate::before { content: "\f501"; } .fa-circle-half-stroke::before { content: "\f042"; } .fa-adjust::before { content: "\f042"; } .fa-clapperboard::before { content: "\e131"; } .fa-circle-radiation::before { content: "\f7ba"; } .fa-radiation-alt::before { content: "\f7ba"; } .fa-baseball::before { content: "\f433"; } .fa-baseball-ball::before { content: "\f433"; } .fa-jet-fighter-up::before { content: "\e518"; } .fa-diagram-project::before { content: "\f542"; } .fa-project-diagram::before { content: "\f542"; } .fa-copy::before { content: "\f0c5"; } .fa-volume-xmark::before { content: "\f6a9"; } .fa-volume-mute::before { content: "\f6a9"; } .fa-volume-times::before { content: "\f6a9"; } .fa-hand-sparkles::before { content: "\e05d"; } .fa-grip::before { content: "\f58d"; } .fa-grip-horizontal::before { content: "\f58d"; } .fa-share-from-square::before { content: "\f14d"; } .fa-share-square::before { content: "\f14d"; } .fa-child-combatant::before { content: "\e4e0"; } .fa-child-rifle::before { content: "\e4e0"; } .fa-gun::before { content: "\e19b"; } .fa-square-phone::before { content: "\f098"; } .fa-phone-square::before { content: "\f098"; } .fa-plus::before { content: "\2b"; } .fa-add::before { content: "\2b"; } .fa-expand::before { content: "\f065"; } .fa-computer::before { content: "\e4e5"; } .fa-xmark::before { content: "\f00d"; } .fa-close::before { content: "\f00d"; } .fa-multiply::before { content: "\f00d"; } .fa-remove::before { content: "\f00d"; } .fa-times::before { content: "\f00d"; } .fa-arrows-up-down-left-right::before { content: "\f047"; } .fa-arrows::before { content: "\f047"; } .fa-chalkboard-user::before { content: "\f51c"; } .fa-chalkboard-teacher::before { content: "\f51c"; } .fa-peso-sign::before { content: "\e222"; } .fa-building-shield::before { content: "\e4d8"; } .fa-baby::before { content: "\f77c"; } .fa-users-line::before { content: "\e592"; } .fa-quote-left::before { content: "\f10d"; } .fa-quote-left-alt::before { content: "\f10d"; } .fa-tractor::before { content: "\f722"; } .fa-trash-arrow-up::before { content: "\f829"; } .fa-trash-restore::before { content: "\f829"; } .fa-arrow-down-up-lock::before { content: "\e4b0"; } .fa-lines-leaning::before { content: "\e51e"; } .fa-ruler-combined::before { content: "\f546"; } .fa-copyright::before { content: "\f1f9"; } .fa-equals::before { content: "\3d"; } .fa-blender::before { content: "\f517"; } .fa-teeth::before { content: "\f62e"; } .fa-shekel-sign::before { content: "\f20b"; } .fa-ils::before { content: "\f20b"; } .fa-shekel::before { content: "\f20b"; } .fa-sheqel::before { content: "\f20b"; } .fa-sheqel-sign::before { content: "\f20b"; } .fa-map::before { content: "\f279"; } .fa-rocket::before { content: "\f135"; } .fa-photo-film::before { content: "\f87c"; } .fa-photo-video::before { content: "\f87c"; } .fa-folder-minus::before { content: "\f65d"; } .fa-store::before { content: "\f54e"; } .fa-arrow-trend-up::before { content: "\e098"; } .fa-plug-circle-minus::before { content: "\e55e"; } .fa-sign-hanging::before { content: "\f4d9"; } .fa-sign::before { content: "\f4d9"; } .fa-bezier-curve::before { content: "\f55b"; } .fa-bell-slash::before { content: "\f1f6"; } .fa-tablet::before { content: "\f3fb"; } .fa-tablet-android::before { content: "\f3fb"; } .fa-school-flag::before { content: "\e56e"; } .fa-fill::before { content: "\f575"; } .fa-angle-up::before { content: "\f106"; } .fa-drumstick-bite::before { content: "\f6d7"; } .fa-holly-berry::before { content: "\f7aa"; } .fa-chevron-left::before { content: "\f053"; } .fa-bacteria::before { content: "\e059"; } .fa-hand-lizard::before { content: "\f258"; } .fa-notdef::before { content: "\e1fe"; } .fa-disease::before { content: "\f7fa"; } .fa-briefcase-medical::before { content: "\f469"; } .fa-genderless::before { content: "\f22d"; } .fa-chevron-right::before { content: "\f054"; } .fa-retweet::before { content: "\f079"; } .fa-car-rear::before { content: "\f5de"; } .fa-car-alt::before { content: "\f5de"; } .fa-pump-soap::before { content: "\e06b"; } .fa-video-slash::before { content: "\f4e2"; } .fa-battery-quarter::before { content: "\f243"; } .fa-battery-2::before { content: "\f243"; } .fa-radio::before { content: "\f8d7"; } .fa-baby-carriage::before { content: "\f77d"; } .fa-carriage-baby::before { content: "\f77d"; } .fa-traffic-light::before { content: "\f637"; } .fa-thermometer::before { content: "\f491"; } .fa-vr-cardboard::before { content: "\f729"; } .fa-hand-middle-finger::before { content: "\f806"; } .fa-percent::before { content: "\25"; } .fa-percentage::before { content: "\25"; } .fa-truck-moving::before { content: "\f4df"; } .fa-glass-water-droplet::before { content: "\e4f5"; } .fa-display::before { content: "\e163"; } .fa-face-smile::before { content: "\f118"; } .fa-smile::before { content: "\f118"; } .fa-thumbtack::before { content: "\f08d"; } .fa-thumb-tack::before { content: "\f08d"; } .fa-trophy::before { content: "\f091"; } .fa-person-praying::before { content: "\f683"; } .fa-pray::before { content: "\f683"; } .fa-hammer::before { content: "\f6e3"; } .fa-hand-peace::before { content: "\f25b"; } .fa-rotate::before { content: "\f2f1"; } .fa-sync-alt::before { content: "\f2f1"; } .fa-spinner::before { content: "\f110"; } .fa-robot::before { content: "\f544"; } .fa-peace::before { content: "\f67c"; } .fa-gears::before { content: "\f085"; } .fa-cogs::before { content: "\f085"; } .fa-warehouse::before { content: "\f494"; } .fa-arrow-up-right-dots::before { content: "\e4b7"; } .fa-splotch::before { content: "\f5bc"; } .fa-face-grin-hearts::before { content: "\f584"; } .fa-grin-hearts::before { content: "\f584"; } .fa-dice-four::before { content: "\f524"; } .fa-sim-card::before { content: "\f7c4"; } .fa-transgender::before { content: "\f225"; } .fa-transgender-alt::before { content: "\f225"; } .fa-mercury::before { content: "\f223"; } .fa-arrow-turn-down::before { content: "\f149"; } .fa-level-down::before { content: "\f149"; } .fa-person-falling-burst::before { content: "\e547"; } .fa-award::before { content: "\f559"; } .fa-ticket-simple::before { content: "\f3ff"; } .fa-ticket-alt::before { content: "\f3ff"; } .fa-building::before { content: "\f1ad"; } .fa-angles-left::before { content: "\f100"; } .fa-angle-double-left::before { content: "\f100"; } .fa-qrcode::before { content: "\f029"; } .fa-clock-rotate-left::before { content: "\f1da"; } .fa-history::before { content: "\f1da"; } .fa-face-grin-beam-sweat::before { content: "\f583"; } .fa-grin-beam-sweat::before { content: "\f583"; } .fa-file-export::before { content: "\f56e"; } .fa-arrow-right-from-file::before { content: "\f56e"; } .fa-shield::before { content: "\f132"; } .fa-shield-blank::before { content: "\f132"; } .fa-arrow-up-short-wide::before { content: "\f885"; } .fa-sort-amount-up-alt::before { content: "\f885"; } .fa-house-medical::before { content: "\e3b2"; } .fa-golf-ball-tee::before { content: "\f450"; } .fa-golf-ball::before { content: "\f450"; } .fa-circle-chevron-left::before { content: "\f137"; } .fa-chevron-circle-left::before { content: "\f137"; } .fa-house-chimney-window::before { content: "\e00d"; } .fa-pen-nib::before { content: "\f5ad"; } .fa-tent-arrow-turn-left::before { content: "\e580"; } .fa-tents::before { content: "\e582"; } .fa-wand-magic::before { content: "\f0d0"; } .fa-magic::before { content: "\f0d0"; } .fa-dog::before { content: "\f6d3"; } .fa-carrot::before { content: "\f787"; } .fa-moon::before { content: "\f186"; } .fa-wine-glass-empty::before { content: "\f5ce"; } .fa-wine-glass-alt::before { content: "\f5ce"; } .fa-cheese::before { content: "\f7ef"; } .fa-yin-yang::before { content: "\f6ad"; } .fa-music::before { content: "\f001"; } .fa-code-commit::before { content: "\f386"; } .fa-temperature-low::before { content: "\f76b"; } .fa-person-biking::before { content: "\f84a"; } .fa-biking::before { content: "\f84a"; } .fa-broom::before { content: "\f51a"; } .fa-shield-heart::before { content: "\e574"; } .fa-gopuram::before { content: "\f664"; } .fa-earth-oceania::before { content: "\e47b"; } .fa-globe-oceania::before { content: "\e47b"; } .fa-square-xmark::before { content: "\f2d3"; } .fa-times-square::before { content: "\f2d3"; } .fa-xmark-square::before { content: "\f2d3"; } .fa-hashtag::before { content: "\23"; } .fa-up-right-and-down-left-from-center::before { content: "\f424"; } .fa-expand-alt::before { content: "\f424"; } .fa-oil-can::before { content: "\f613"; } .fa-t::before { content: "\54"; } .fa-hippo::before { content: "\f6ed"; } .fa-chart-column::before { content: "\e0e3"; } .fa-infinity::before { content: "\f534"; } .fa-vial-circle-check::before { content: "\e596"; } .fa-person-arrow-down-to-line::before { content: "\e538"; } .fa-voicemail::before { content: "\f897"; } .fa-fan::before { content: "\f863"; } .fa-person-walking-luggage::before { content: "\e554"; } .fa-up-down::before { content: "\f338"; } .fa-arrows-alt-v::before { content: "\f338"; } .fa-cloud-moon-rain::before { content: "\f73c"; } .fa-calendar::before { content: "\f133"; } .fa-trailer::before { content: "\e041"; } .fa-bahai::before { content: "\f666"; } .fa-haykal::before { content: "\f666"; } .fa-sd-card::before { content: "\f7c2"; } .fa-dragon::before { content: "\f6d5"; } .fa-shoe-prints::before { content: "\f54b"; } .fa-circle-plus::before { content: "\f055"; } .fa-plus-circle::before { content: "\f055"; } .fa-face-grin-tongue-wink::before { content: "\f58b"; } .fa-grin-tongue-wink::before { content: "\f58b"; } .fa-hand-holding::before { content: "\f4bd"; } .fa-plug-circle-exclamation::before { content: "\e55d"; } .fa-link-slash::before { content: "\f127"; } .fa-chain-broken::before { content: "\f127"; } .fa-chain-slash::before { content: "\f127"; } .fa-unlink::before { content: "\f127"; } .fa-clone::before { content: "\f24d"; } .fa-person-walking-arrow-loop-left::before { content: "\e551"; } .fa-arrow-up-z-a::before { content: "\f882"; } .fa-sort-alpha-up-alt::before { content: "\f882"; } .fa-fire-flame-curved::before { content: "\f7e4"; } .fa-fire-alt::before { content: "\f7e4"; } .fa-tornado::before { content: "\f76f"; } .fa-file-circle-plus::before { content: "\e494"; } .fa-book-quran::before { content: "\f687"; } .fa-quran::before { content: "\f687"; } .fa-anchor::before { content: "\f13d"; } .fa-border-all::before { content: "\f84c"; } .fa-face-angry::before { content: "\f556"; } .fa-angry::before { content: "\f556"; } .fa-cookie-bite::before { content: "\f564"; } .fa-arrow-trend-down::before { content: "\e097"; } .fa-rss::before { content: "\f09e"; } .fa-feed::before { content: "\f09e"; } .fa-draw-polygon::before { content: "\f5ee"; } .fa-scale-balanced::before { content: "\f24e"; } .fa-balance-scale::before { content: "\f24e"; } .fa-gauge-simple-high::before { content: "\f62a"; } .fa-tachometer::before { content: "\f62a"; } .fa-tachometer-fast::before { content: "\f62a"; } .fa-shower::before { content: "\f2cc"; } .fa-desktop::before { content: "\f390"; } .fa-desktop-alt::before { content: "\f390"; } .fa-m::before { content: "\4d"; } .fa-table-list::before { content: "\f00b"; } .fa-th-list::before { content: "\f00b"; } .fa-comment-sms::before { content: "\f7cd"; } .fa-sms::before { content: "\f7cd"; } .fa-book::before { content: "\f02d"; } .fa-user-plus::before { content: "\f234"; } .fa-check::before { content: "\f00c"; } .fa-battery-three-quarters::before { content: "\f241"; } .fa-battery-4::before { content: "\f241"; } .fa-house-circle-check::before { content: "\e509"; } .fa-angle-left::before { content: "\f104"; } .fa-diagram-successor::before { content: "\e47a"; } .fa-truck-arrow-right::before { content: "\e58b"; } .fa-arrows-split-up-and-left::before { content: "\e4bc"; } .fa-hand-fist::before { content: "\f6de"; } .fa-fist-raised::before { content: "\f6de"; } .fa-cloud-moon::before { content: "\f6c3"; } .fa-briefcase::before { content: "\f0b1"; } .fa-person-falling::before { content: "\e546"; } .fa-image-portrait::before { content: "\f3e0"; } .fa-portrait::before { content: "\f3e0"; } .fa-user-tag::before { content: "\f507"; } .fa-rug::before { content: "\e569"; } .fa-earth-europe::before { content: "\f7a2"; } .fa-globe-europe::before { content: "\f7a2"; } .fa-cart-flatbed-suitcase::before { content: "\f59d"; } .fa-luggage-cart::before { content: "\f59d"; } .fa-rectangle-xmark::before { content: "\f410"; } .fa-rectangle-times::before { content: "\f410"; } .fa-times-rectangle::before { content: "\f410"; } .fa-window-close::before { content: "\f410"; } .fa-baht-sign::before { content: "\e0ac"; } .fa-book-open::before { content: "\f518"; } .fa-book-journal-whills::before { content: "\f66a"; } .fa-journal-whills::before { content: "\f66a"; } .fa-handcuffs::before { content: "\e4f8"; } .fa-triangle-exclamation::before { content: "\f071"; } .fa-exclamation-triangle::before { content: "\f071"; } .fa-warning::before { content: "\f071"; } .fa-database::before { content: "\f1c0"; } .fa-share::before { content: "\f064"; } .fa-mail-forward::before { content: "\f064"; } .fa-bottle-droplet::before { content: "\e4c4"; } .fa-mask-face::before { content: "\e1d7"; } .fa-hill-rockslide::before { content: "\e508"; } .fa-right-left::before { content: "\f362"; } .fa-exchange-alt::before { content: "\f362"; } .fa-paper-plane::before { content: "\f1d8"; } .fa-road-circle-exclamation::before { content: "\e565"; } .fa-dungeon::before { content: "\f6d9"; } .fa-align-right::before { content: "\f038"; } .fa-money-bill-1-wave::before { content: "\f53b"; } .fa-money-bill-wave-alt::before { content: "\f53b"; } .fa-life-ring::before { content: "\f1cd"; } .fa-hands::before { content: "\f2a7"; } .fa-sign-language::before { content: "\f2a7"; } .fa-signing::before { content: "\f2a7"; } .fa-calendar-day::before { content: "\f783"; } .fa-water-ladder::before { content: "\f5c5"; } .fa-ladder-water::before { content: "\f5c5"; } .fa-swimming-pool::before { content: "\f5c5"; } .fa-arrows-up-down::before { content: "\f07d"; } .fa-arrows-v::before { content: "\f07d"; } .fa-face-grimace::before { content: "\f57f"; } .fa-grimace::before { content: "\f57f"; } .fa-wheelchair-move::before { content: "\e2ce"; } .fa-wheelchair-alt::before { content: "\e2ce"; } .fa-turn-down::before { content: "\f3be"; } .fa-level-down-alt::before { content: "\f3be"; } .fa-person-walking-arrow-right::before { content: "\e552"; } .fa-square-envelope::before { content: "\f199"; } .fa-envelope-square::before { content: "\f199"; } .fa-dice::before { content: "\f522"; } .fa-bowling-ball::before { content: "\f436"; } .fa-brain::before { content: "\f5dc"; } .fa-bandage::before { content: "\f462"; } .fa-band-aid::before { content: "\f462"; } .fa-calendar-minus::before { content: "\f272"; } .fa-circle-xmark::before { content: "\f057"; } .fa-times-circle::before { content: "\f057"; } .fa-xmark-circle::before { content: "\f057"; } .fa-gifts::before { content: "\f79c"; } .fa-hotel::before { content: "\f594"; } .fa-earth-asia::before { content: "\f57e"; } .fa-globe-asia::before { content: "\f57e"; } .fa-id-card-clip::before { content: "\f47f"; } .fa-id-card-alt::before { content: "\f47f"; } .fa-magnifying-glass-plus::before { content: "\f00e"; } .fa-search-plus::before { content: "\f00e"; } .fa-thumbs-up::before { content: "\f164"; } .fa-user-clock::before { content: "\f4fd"; } .fa-hand-dots::before { content: "\f461"; } .fa-allergies::before { content: "\f461"; } .fa-file-invoice::before { content: "\f570"; } .fa-window-minimize::before { content: "\f2d1"; } .fa-mug-saucer::before { content: "\f0f4"; } .fa-coffee::before { content: "\f0f4"; } .fa-brush::before { content: "\f55d"; } .fa-mask::before { content: "\f6fa"; } .fa-magnifying-glass-minus::before { content: "\f010"; } .fa-search-minus::before { content: "\f010"; } .fa-ruler-vertical::before { content: "\f548"; } .fa-user-large::before { content: "\f406"; } .fa-user-alt::before { content: "\f406"; } .fa-train-tram::before { content: "\e5b4"; } .fa-user-nurse::before { content: "\f82f"; } .fa-syringe::before { content: "\f48e"; } .fa-cloud-sun::before { content: "\f6c4"; } .fa-stopwatch-20::before { content: "\e06f"; } .fa-square-full::before { content: "\f45c"; } .fa-magnet::before { content: "\f076"; } .fa-jar::before { content: "\e516"; } .fa-note-sticky::before { content: "\f249"; } .fa-sticky-note::before { content: "\f249"; } .fa-bug-slash::before { content: "\e490"; } .fa-arrow-up-from-water-pump::before { content: "\e4b6"; } .fa-bone::before { content: "\f5d7"; } .fa-user-injured::before { content: "\f728"; } .fa-face-sad-tear::before { content: "\f5b4"; } .fa-sad-tear::before { content: "\f5b4"; } .fa-plane::before { content: "\f072"; } .fa-tent-arrows-down::before { content: "\e581"; } .fa-exclamation::before { content: "\21"; } .fa-arrows-spin::before { content: "\e4bb"; } .fa-print::before { content: "\f02f"; } .fa-turkish-lira-sign::before { content: "\e2bb"; } .fa-try::before { content: "\e2bb"; } .fa-turkish-lira::before { content: "\e2bb"; } .fa-dollar-sign::before { content: "\24"; } .fa-dollar::before { content: "\24"; } .fa-usd::before { content: "\24"; } .fa-x::before { content: "\58"; } .fa-magnifying-glass-dollar::before { content: "\f688"; } .fa-search-dollar::before { content: "\f688"; } .fa-users-gear::before { content: "\f509"; } .fa-users-cog::before { content: "\f509"; } .fa-person-military-pointing::before { content: "\e54a"; } .fa-building-columns::before { content: "\f19c"; } .fa-bank::before { content: "\f19c"; } .fa-institution::before { content: "\f19c"; } .fa-museum::before { content: "\f19c"; } .fa-university::before { content: "\f19c"; } .fa-umbrella::before { content: "\f0e9"; } .fa-trowel::before { content: "\e589"; } .fa-d::before { content: "\44"; } .fa-stapler::before { content: "\e5af"; } .fa-masks-theater::before { content: "\f630"; } .fa-theater-masks::before { content: "\f630"; } .fa-kip-sign::before { content: "\e1c4"; } .fa-hand-point-left::before { content: "\f0a5"; } .fa-handshake-simple::before { content: "\f4c6"; } .fa-handshake-alt::before { content: "\f4c6"; } .fa-jet-fighter::before { content: "\f0fb"; } .fa-fighter-jet::before { content: "\f0fb"; } .fa-square-share-nodes::before { content: "\f1e1"; } .fa-share-alt-square::before { content: "\f1e1"; } .fa-barcode::before { content: "\f02a"; } .fa-plus-minus::before { content: "\e43c"; } .fa-video::before { content: "\f03d"; } .fa-video-camera::before { content: "\f03d"; } .fa-graduation-cap::before { content: "\f19d"; } .fa-mortar-board::before { content: "\f19d"; } .fa-hand-holding-medical::before { content: "\e05c"; } .fa-person-circle-check::before { content: "\e53e"; } .fa-turn-up::before { content: "\f3bf"; } .fa-level-up-alt::before { content: "\f3bf"; } .sr-only, .fa-sr-only { position: absolute; width: 1px; height: 1px; padding: 0; margin: -1px; overflow: hidden; clip: rect(0, 0, 0, 0); white-space: nowrap; border-width: 0; } .sr-only-focusable:not(:focus), .fa-sr-only-focusable:not(:focus) { position: absolute; width: 1px; height: 1px; padding: 0; margin: -1px; overflow: hidden; clip: rect(0, 0, 0, 0); white-space: nowrap; border-width: 0; } :root, :host { --fa-style-family-brands: 'Font Awesome 6 Brands'; --fa-font-brands: normal 400 1em/1 'Font Awesome 6 Brands'; } @font-face { font-family: 'Font Awesome 6 Brands'; font-style: normal; font-weight: 400; font-display: block; src: url("../webfonts/fa-brands-400.woff2") format("woff2"), url("../webfonts/fa-brands-400.ttf") format("truetype"); } .fab, .fa-brands { font-weight: 400; } .fa-monero:before { content: "\f3d0"; } .fa-hooli:before { content: "\f427"; } .fa-yelp:before { content: "\f1e9"; } .fa-cc-visa:before { content: "\f1f0"; } .fa-lastfm:before { content: "\f202"; } .fa-shopware:before { content: "\f5b5"; } .fa-creative-commons-nc:before { content: "\f4e8"; } .fa-aws:before { content: "\f375"; } .fa-redhat:before { content: "\f7bc"; } .fa-yoast:before { content: "\f2b1"; } .fa-cloudflare:before { content: "\e07d"; } .fa-ups:before { content: "\f7e0"; } .fa-pixiv:before { content: "\e640"; } .fa-wpexplorer:before { content: "\f2de"; } .fa-dyalog:before { content: "\f399"; } .fa-bity:before { content: "\f37a"; } .fa-stackpath:before { content: "\f842"; } .fa-buysellads:before { content: "\f20d"; } .fa-first-order:before { content: "\f2b0"; } .fa-modx:before { content: "\f285"; } .fa-guilded:before { content: "\e07e"; } .fa-vnv:before { content: "\f40b"; } .fa-square-js:before { content: "\f3b9"; } .fa-js-square:before { content: "\f3b9"; } .fa-microsoft:before { content: "\f3ca"; } .fa-qq:before { content: "\f1d6"; } .fa-orcid:before { content: "\f8d2"; } .fa-java:before { content: "\f4e4"; } .fa-invision:before { content: "\f7b0"; } .fa-creative-commons-pd-alt:before { content: "\f4ed"; } .fa-centercode:before { content: "\f380"; } .fa-glide-g:before { content: "\f2a6"; } .fa-drupal:before { content: "\f1a9"; } .fa-jxl:before { content: "\e67b"; } .fa-hire-a-helper:before { content: "\f3b0"; } .fa-creative-commons-by:before { content: "\f4e7"; } .fa-unity:before { content: "\e049"; } .fa-whmcs:before { content: "\f40d"; } .fa-rocketchat:before { content: "\f3e8"; } .fa-vk:before { content: "\f189"; } .fa-untappd:before { content: "\f405"; } .fa-mailchimp:before { content: "\f59e"; } .fa-css3-alt:before { content: "\f38b"; } .fa-square-reddit:before { content: "\f1a2"; } .fa-reddit-square:before { content: "\f1a2"; } .fa-vimeo-v:before { content: "\f27d"; } .fa-contao:before { content: "\f26d"; } .fa-square-font-awesome:before { content: "\e5ad"; } .fa-deskpro:before { content: "\f38f"; } .fa-brave:before { content: "\e63c"; } .fa-sistrix:before { content: "\f3ee"; } .fa-square-instagram:before { content: "\e055"; } .fa-instagram-square:before { content: "\e055"; } .fa-battle-net:before { content: "\f835"; } .fa-the-red-yeti:before { content: "\f69d"; } .fa-square-hacker-news:before { content: "\f3af"; } .fa-hacker-news-square:before { content: "\f3af"; } .fa-edge:before { content: "\f282"; } .fa-threads:before { content: "\e618"; } .fa-napster:before { content: "\f3d2"; } .fa-square-snapchat:before { content: "\f2ad"; } .fa-snapchat-square:before { content: "\f2ad"; } .fa-google-plus-g:before { content: "\f0d5"; } .fa-artstation:before { content: "\f77a"; } .fa-markdown:before { content: "\f60f"; } .fa-sourcetree:before { content: "\f7d3"; } .fa-google-plus:before { content: "\f2b3"; } .fa-diaspora:before { content: "\f791"; } .fa-foursquare:before { content: "\f180"; } .fa-stack-overflow:before { content: "\f16c"; } .fa-github-alt:before { content: "\f113"; } .fa-phoenix-squadron:before { content: "\f511"; } .fa-pagelines:before { content: "\f18c"; } .fa-algolia:before { content: "\f36c"; } .fa-red-river:before { content: "\f3e3"; } .fa-creative-commons-sa:before { content: "\f4ef"; } .fa-safari:before { content: "\f267"; } .fa-google:before { content: "\f1a0"; } .fa-square-font-awesome-stroke:before { content: "\f35c"; } .fa-font-awesome-alt:before { content: "\f35c"; } .fa-atlassian:before { content: "\f77b"; } .fa-linkedin-in:before { content: "\f0e1"; } .fa-digital-ocean:before { content: "\f391"; } .fa-nimblr:before { content: "\f5a8"; } .fa-chromecast:before { content: "\f838"; } .fa-evernote:before { content: "\f839"; } .fa-hacker-news:before { content: "\f1d4"; } .fa-creative-commons-sampling:before { content: "\f4f0"; } .fa-adversal:before { content: "\f36a"; } .fa-creative-commons:before { content: "\f25e"; } .fa-watchman-monitoring:before { content: "\e087"; } .fa-fonticons:before { content: "\f280"; } .fa-weixin:before { content: "\f1d7"; } .fa-shirtsinbulk:before { content: "\f214"; } .fa-codepen:before { content: "\f1cb"; } .fa-git-alt:before { content: "\f841"; } .fa-lyft:before { content: "\f3c3"; } .fa-rev:before { content: "\f5b2"; } .fa-windows:before { content: "\f17a"; } .fa-wizards-of-the-coast:before { content: "\f730"; } .fa-square-viadeo:before { content: "\f2aa"; } .fa-viadeo-square:before { content: "\f2aa"; } .fa-meetup:before { content: "\f2e0"; } .fa-centos:before { content: "\f789"; } .fa-adn:before { content: "\f170"; } .fa-cloudsmith:before { content: "\f384"; } .fa-opensuse:before { content: "\e62b"; } .fa-pied-piper-alt:before { content: "\f1a8"; } .fa-square-dribbble:before { content: "\f397"; } .fa-dribbble-square:before { content: "\f397"; } .fa-codiepie:before { content: "\f284"; } .fa-node:before { content: "\f419"; } .fa-mix:before { content: "\f3cb"; } .fa-steam:before { content: "\f1b6"; } .fa-cc-apple-pay:before { content: "\f416"; } .fa-scribd:before { content: "\f28a"; } .fa-debian:before { content: "\e60b"; } .fa-openid:before { content: "\f19b"; } .fa-instalod:before { content: "\e081"; } .fa-expeditedssl:before { content: "\f23e"; } .fa-sellcast:before { content: "\f2da"; } .fa-square-twitter:before { content: "\f081"; } .fa-twitter-square:before { content: "\f081"; } .fa-r-project:before { content: "\f4f7"; } .fa-delicious:before { content: "\f1a5"; } .fa-freebsd:before { content: "\f3a4"; } .fa-vuejs:before { content: "\f41f"; } .fa-accusoft:before { content: "\f369"; } .fa-ioxhost:before { content: "\f208"; } .fa-fonticons-fi:before { content: "\f3a2"; } .fa-app-store:before { content: "\f36f"; } .fa-cc-mastercard:before { content: "\f1f1"; } .fa-itunes-note:before { content: "\f3b5"; } .fa-golang:before { content: "\e40f"; } .fa-kickstarter:before { content: "\f3bb"; } .fa-square-kickstarter:before { content: "\f3bb"; } .fa-grav:before { content: "\f2d6"; } .fa-weibo:before { content: "\f18a"; } .fa-uncharted:before { content: "\e084"; } .fa-firstdraft:before { content: "\f3a1"; } .fa-square-youtube:before { content: "\f431"; } .fa-youtube-square:before { content: "\f431"; } .fa-wikipedia-w:before { content: "\f266"; } .fa-wpressr:before { content: "\f3e4"; } .fa-rendact:before { content: "\f3e4"; } .fa-angellist:before { content: "\f209"; } .fa-galactic-republic:before { content: "\f50c"; } .fa-nfc-directional:before { content: "\e530"; } .fa-skype:before { content: "\f17e"; } .fa-joget:before { content: "\f3b7"; } .fa-fedora:before { content: "\f798"; } .fa-stripe-s:before { content: "\f42a"; } .fa-meta:before { content: "\e49b"; } .fa-laravel:before { content: "\f3bd"; } .fa-hotjar:before { content: "\f3b1"; } .fa-bluetooth-b:before { content: "\f294"; } .fa-square-letterboxd:before { content: "\e62e"; } .fa-sticker-mule:before { content: "\f3f7"; } .fa-creative-commons-zero:before { content: "\f4f3"; } .fa-hips:before { content: "\f452"; } .fa-behance:before { content: "\f1b4"; } .fa-reddit:before { content: "\f1a1"; } .fa-discord:before { content: "\f392"; } .fa-chrome:before { content: "\f268"; } .fa-app-store-ios:before { content: "\f370"; } .fa-cc-discover:before { content: "\f1f2"; } .fa-wpbeginner:before { content: "\f297"; } .fa-confluence:before { content: "\f78d"; } .fa-shoelace:before { content: "\e60c"; } .fa-mdb:before { content: "\f8ca"; } .fa-dochub:before { content: "\f394"; } .fa-accessible-icon:before { content: "\f368"; } .fa-ebay:before { content: "\f4f4"; } .fa-amazon:before { content: "\f270"; } .fa-unsplash:before { content: "\e07c"; } .fa-yarn:before { content: "\f7e3"; } .fa-square-steam:before { content: "\f1b7"; } .fa-steam-square:before { content: "\f1b7"; } .fa-500px:before { content: "\f26e"; } .fa-square-vimeo:before { content: "\f194"; } .fa-vimeo-square:before { content: "\f194"; } .fa-asymmetrik:before { content: "\f372"; } .fa-font-awesome:before { content: "\f2b4"; } .fa-font-awesome-flag:before { content: "\f2b4"; } .fa-font-awesome-logo-full:before { content: "\f2b4"; } .fa-gratipay:before { content: "\f184"; } .fa-apple:before { content: "\f179"; } .fa-hive:before { content: "\e07f"; } .fa-gitkraken:before { content: "\f3a6"; } .fa-keybase:before { content: "\f4f5"; } .fa-apple-pay:before { content: "\f415"; } .fa-padlet:before { content: "\e4a0"; } .fa-amazon-pay:before { content: "\f42c"; } .fa-square-github:before { content: "\f092"; } .fa-github-square:before { content: "\f092"; } .fa-stumbleupon:before { content: "\f1a4"; } .fa-fedex:before { content: "\f797"; } .fa-phoenix-framework:before { content: "\f3dc"; } .fa-shopify:before { content: "\e057"; } .fa-neos:before { content: "\f612"; } .fa-square-threads:before { content: "\e619"; } .fa-hackerrank:before { content: "\f5f7"; } .fa-researchgate:before { content: "\f4f8"; } .fa-swift:before { content: "\f8e1"; } .fa-angular:before { content: "\f420"; } .fa-speakap:before { content: "\f3f3"; } .fa-angrycreative:before { content: "\f36e"; } .fa-y-combinator:before { content: "\f23b"; } .fa-empire:before { content: "\f1d1"; } .fa-envira:before { content: "\f299"; } .fa-google-scholar:before { content: "\e63b"; } .fa-square-gitlab:before { content: "\e5ae"; } .fa-gitlab-square:before { content: "\e5ae"; } .fa-studiovinari:before { content: "\f3f8"; } .fa-pied-piper:before { content: "\f2ae"; } .fa-wordpress:before { content: "\f19a"; } .fa-product-hunt:before { content: "\f288"; } .fa-firefox:before { content: "\f269"; } .fa-linode:before { content: "\f2b8"; } .fa-goodreads:before { content: "\f3a8"; } .fa-square-odnoklassniki:before { content: "\f264"; } .fa-odnoklassniki-square:before { content: "\f264"; } .fa-jsfiddle:before { content: "\f1cc"; } .fa-sith:before { content: "\f512"; } .fa-themeisle:before { content: "\f2b2"; } .fa-page4:before { content: "\f3d7"; } .fa-hashnode:before { content: "\e499"; } .fa-react:before { content: "\f41b"; } .fa-cc-paypal:before { content: "\f1f4"; } .fa-squarespace:before { content: "\f5be"; } .fa-cc-stripe:before { content: "\f1f5"; } .fa-creative-commons-share:before { content: "\f4f2"; } .fa-bitcoin:before { content: "\f379"; } .fa-keycdn:before { content: "\f3ba"; } .fa-opera:before { content: "\f26a"; } .fa-itch-io:before { content: "\f83a"; } .fa-umbraco:before { content: "\f8e8"; } .fa-galactic-senate:before { content: "\f50d"; } .fa-ubuntu:before { content: "\f7df"; } .fa-draft2digital:before { content: "\f396"; } .fa-stripe:before { content: "\f429"; } .fa-houzz:before { content: "\f27c"; } .fa-gg:before { content: "\f260"; } .fa-dhl:before { content: "\f790"; } .fa-square-pinterest:before { content: "\f0d3"; } .fa-pinterest-square:before { content: "\f0d3"; } .fa-xing:before { content: "\f168"; } .fa-blackberry:before { content: "\f37b"; } .fa-creative-commons-pd:before { content: "\f4ec"; } .fa-playstation:before { content: "\f3df"; } .fa-quinscape:before { content: "\f459"; } .fa-less:before { content: "\f41d"; } .fa-blogger-b:before { content: "\f37d"; } .fa-opencart:before { content: "\f23d"; } .fa-vine:before { content: "\f1ca"; } .fa-signal-messenger:before { content: "\e663"; } .fa-paypal:before { content: "\f1ed"; } .fa-gitlab:before { content: "\f296"; } .fa-typo3:before { content: "\f42b"; } .fa-reddit-alien:before { content: "\f281"; } .fa-yahoo:before { content: "\f19e"; } .fa-dailymotion:before { content: "\e052"; } .fa-affiliatetheme:before { content: "\f36b"; } .fa-pied-piper-pp:before { content: "\f1a7"; } .fa-bootstrap:before { content: "\f836"; } .fa-odnoklassniki:before { content: "\f263"; } .fa-nfc-symbol:before { content: "\e531"; } .fa-mintbit:before { content: "\e62f"; } .fa-ethereum:before { content: "\f42e"; } .fa-speaker-deck:before { content: "\f83c"; } .fa-creative-commons-nc-eu:before { content: "\f4e9"; } .fa-patreon:before { content: "\f3d9"; } .fa-avianex:before { content: "\f374"; } .fa-ello:before { content: "\f5f1"; } .fa-gofore:before { content: "\f3a7"; } .fa-bimobject:before { content: "\f378"; } .fa-brave-reverse:before { content: "\e63d"; } .fa-facebook-f:before { content: "\f39e"; } .fa-square-google-plus:before { content: "\f0d4"; } .fa-google-plus-square:before { content: "\f0d4"; } .fa-web-awesome:before { content: "\e682"; } .fa-mandalorian:before { content: "\f50f"; } .fa-first-order-alt:before { content: "\f50a"; } .fa-osi:before { content: "\f41a"; } .fa-google-wallet:before { content: "\f1ee"; } .fa-d-and-d-beyond:before { content: "\f6ca"; } .fa-periscope:before { content: "\f3da"; } .fa-fulcrum:before { content: "\f50b"; } .fa-cloudscale:before { content: "\f383"; } .fa-forumbee:before { content: "\f211"; } .fa-mizuni:before { content: "\f3cc"; } .fa-schlix:before { content: "\f3ea"; } .fa-square-xing:before { content: "\f169"; } .fa-xing-square:before { content: "\f169"; } .fa-bandcamp:before { content: "\f2d5"; } .fa-wpforms:before { content: "\f298"; } .fa-cloudversify:before { content: "\f385"; } .fa-usps:before { content: "\f7e1"; } .fa-megaport:before { content: "\f5a3"; } .fa-magento:before { content: "\f3c4"; } .fa-spotify:before { content: "\f1bc"; } .fa-optin-monster:before { content: "\f23c"; } .fa-fly:before { content: "\f417"; } .fa-aviato:before { content: "\f421"; } .fa-itunes:before { content: "\f3b4"; } .fa-cuttlefish:before { content: "\f38c"; } .fa-blogger:before { content: "\f37c"; } .fa-flickr:before { content: "\f16e"; } .fa-viber:before { content: "\f409"; } .fa-soundcloud:before { content: "\f1be"; } .fa-digg:before { content: "\f1a6"; } .fa-tencent-weibo:before { content: "\f1d5"; } .fa-letterboxd:before { content: "\e62d"; } .fa-symfony:before { content: "\f83d"; } .fa-maxcdn:before { content: "\f136"; } .fa-etsy:before { content: "\f2d7"; } .fa-facebook-messenger:before { content: "\f39f"; } .fa-audible:before { content: "\f373"; } .fa-think-peaks:before { content: "\f731"; } .fa-bilibili:before { content: "\e3d9"; } .fa-erlang:before { content: "\f39d"; } .fa-x-twitter:before { content: "\e61b"; } .fa-cotton-bureau:before { content: "\f89e"; } .fa-dashcube:before { content: "\f210"; } .fa-42-group:before { content: "\e080"; } .fa-innosoft:before { content: "\e080"; } .fa-stack-exchange:before { content: "\f18d"; } .fa-elementor:before { content: "\f430"; } .fa-square-pied-piper:before { content: "\e01e"; } .fa-pied-piper-square:before { content: "\e01e"; } .fa-creative-commons-nd:before { content: "\f4eb"; } .fa-palfed:before { content: "\f3d8"; } .fa-superpowers:before { content: "\f2dd"; } .fa-resolving:before { content: "\f3e7"; } .fa-xbox:before { content: "\f412"; } .fa-square-web-awesome-stroke:before { content: "\e684"; } .fa-searchengin:before { content: "\f3eb"; } .fa-tiktok:before { content: "\e07b"; } .fa-square-facebook:before { content: "\f082"; } .fa-facebook-square:before { content: "\f082"; } .fa-renren:before { content: "\f18b"; } .fa-linux:before { content: "\f17c"; } .fa-glide:before { content: "\f2a5"; } .fa-linkedin:before { content: "\f08c"; } .fa-hubspot:before { content: "\f3b2"; } .fa-deploydog:before { content: "\f38e"; } .fa-twitch:before { content: "\f1e8"; } .fa-ravelry:before { content: "\f2d9"; } .fa-mixer:before { content: "\e056"; } .fa-square-lastfm:before { content: "\f203"; } .fa-lastfm-square:before { content: "\f203"; } .fa-vimeo:before { content: "\f40a"; } .fa-mendeley:before { content: "\f7b3"; } .fa-uniregistry:before { content: "\f404"; } .fa-figma:before { content: "\f799"; } .fa-creative-commons-remix:before { content: "\f4ee"; } .fa-cc-amazon-pay:before { content: "\f42d"; } .fa-dropbox:before { content: "\f16b"; } .fa-instagram:before { content: "\f16d"; } .fa-cmplid:before { content: "\e360"; } .fa-upwork:before { content: "\e641"; } .fa-facebook:before { content: "\f09a"; } .fa-gripfire:before { content: "\f3ac"; } .fa-jedi-order:before { content: "\f50e"; } .fa-uikit:before { content: "\f403"; } .fa-fort-awesome-alt:before { content: "\f3a3"; } .fa-phabricator:before { content: "\f3db"; } .fa-ussunnah:before { content: "\f407"; } .fa-earlybirds:before { content: "\f39a"; } .fa-trade-federation:before { content: "\f513"; } .fa-autoprefixer:before { content: "\f41c"; } .fa-whatsapp:before { content: "\f232"; } .fa-square-upwork:before { content: "\e67c"; } .fa-slideshare:before { content: "\f1e7"; } .fa-google-play:before { content: "\f3ab"; } .fa-viadeo:before { content: "\f2a9"; } .fa-line:before { content: "\f3c0"; } .fa-google-drive:before { content: "\f3aa"; } .fa-servicestack:before { content: "\f3ec"; } .fa-simplybuilt:before { content: "\f215"; } .fa-bitbucket:before { content: "\f171"; } .fa-imdb:before { content: "\f2d8"; } .fa-deezer:before { content: "\e077"; } .fa-raspberry-pi:before { content: "\f7bb"; } .fa-jira:before { content: "\f7b1"; } .fa-docker:before { content: "\f395"; } .fa-screenpal:before { content: "\e570"; } .fa-bluetooth:before { content: "\f293"; } .fa-gitter:before { content: "\f426"; } .fa-d-and-d:before { content: "\f38d"; } .fa-microblog:before { content: "\e01a"; } .fa-cc-diners-club:before { content: "\f24c"; } .fa-gg-circle:before { content: "\f261"; } .fa-pied-piper-hat:before { content: "\f4e5"; } .fa-kickstarter-k:before { content: "\f3bc"; } .fa-yandex:before { content: "\f413"; } .fa-readme:before { content: "\f4d5"; } .fa-html5:before { content: "\f13b"; } .fa-sellsy:before { content: "\f213"; } .fa-square-web-awesome:before { content: "\e683"; } .fa-sass:before { content: "\f41e"; } .fa-wirsindhandwerk:before { content: "\e2d0"; } .fa-wsh:before { content: "\e2d0"; } .fa-buromobelexperte:before { content: "\f37f"; } .fa-salesforce:before { content: "\f83b"; } .fa-octopus-deploy:before { content: "\e082"; } .fa-medapps:before { content: "\f3c6"; } .fa-ns8:before { content: "\f3d5"; } .fa-pinterest-p:before { content: "\f231"; } .fa-apper:before { content: "\f371"; } .fa-fort-awesome:before { content: "\f286"; } .fa-waze:before { content: "\f83f"; } .fa-bluesky:before { content: "\e671"; } .fa-cc-jcb:before { content: "\f24b"; } .fa-snapchat:before { content: "\f2ab"; } .fa-snapchat-ghost:before { content: "\f2ab"; } .fa-fantasy-flight-games:before { content: "\f6dc"; } .fa-rust:before { content: "\e07a"; } .fa-wix:before { content: "\f5cf"; } .fa-square-behance:before { content: "\f1b5"; } .fa-behance-square:before { content: "\f1b5"; } .fa-supple:before { content: "\f3f9"; } .fa-webflow:before { content: "\e65c"; } .fa-rebel:before { content: "\f1d0"; } .fa-css3:before { content: "\f13c"; } .fa-staylinked:before { content: "\f3f5"; } .fa-kaggle:before { content: "\f5fa"; } .fa-space-awesome:before { content: "\e5ac"; } .fa-deviantart:before { content: "\f1bd"; } .fa-cpanel:before { content: "\f388"; } .fa-goodreads-g:before { content: "\f3a9"; } .fa-square-git:before { content: "\f1d2"; } .fa-git-square:before { content: "\f1d2"; } .fa-square-tumblr:before { content: "\f174"; } .fa-tumblr-square:before { content: "\f174"; } .fa-trello:before { content: "\f181"; } .fa-creative-commons-nc-jp:before { content: "\f4ea"; } .fa-get-pocket:before { content: "\f265"; } .fa-perbyte:before { content: "\e083"; } .fa-grunt:before { content: "\f3ad"; } .fa-weebly:before { content: "\f5cc"; } .fa-connectdevelop:before { content: "\f20e"; } .fa-leanpub:before { content: "\f212"; } .fa-black-tie:before { content: "\f27e"; } .fa-themeco:before { content: "\f5c6"; } .fa-python:before { content: "\f3e2"; } .fa-android:before { content: "\f17b"; } .fa-bots:before { content: "\e340"; } .fa-free-code-camp:before { content: "\f2c5"; } .fa-hornbill:before { content: "\f592"; } .fa-js:before { content: "\f3b8"; } .fa-ideal:before { content: "\e013"; } .fa-git:before { content: "\f1d3"; } .fa-dev:before { content: "\f6cc"; } .fa-sketch:before { content: "\f7c6"; } .fa-yandex-international:before { content: "\f414"; } .fa-cc-amex:before { content: "\f1f3"; } .fa-uber:before { content: "\f402"; } .fa-github:before { content: "\f09b"; } .fa-php:before { content: "\f457"; } .fa-alipay:before { content: "\f642"; } .fa-youtube:before { content: "\f167"; } .fa-skyatlas:before { content: "\f216"; } .fa-firefox-browser:before { content: "\e007"; } .fa-replyd:before { content: "\f3e6"; } .fa-suse:before { content: "\f7d6"; } .fa-jenkins:before { content: "\f3b6"; } .fa-twitter:before { content: "\f099"; } .fa-rockrms:before { content: "\f3e9"; } .fa-pinterest:before { content: "\f0d2"; } .fa-buffer:before { content: "\f837"; } .fa-npm:before { content: "\f3d4"; } .fa-yammer:before { content: "\f840"; } .fa-btc:before { content: "\f15a"; } .fa-dribbble:before { content: "\f17d"; } .fa-stumbleupon-circle:before { content: "\f1a3"; } .fa-internet-explorer:before { content: "\f26b"; } .fa-stubber:before { content: "\e5c7"; } .fa-telegram:before { content: "\f2c6"; } .fa-telegram-plane:before { content: "\f2c6"; } .fa-old-republic:before { content: "\f510"; } .fa-odysee:before { content: "\e5c6"; } .fa-square-whatsapp:before { content: "\f40c"; } .fa-whatsapp-square:before { content: "\f40c"; } .fa-node-js:before { content: "\f3d3"; } .fa-edge-legacy:before { content: "\e078"; } .fa-slack:before { content: "\f198"; } .fa-slack-hash:before { content: "\f198"; } .fa-medrt:before { content: "\f3c8"; } .fa-usb:before { content: "\f287"; } .fa-tumblr:before { content: "\f173"; } .fa-vaadin:before { content: "\f408"; } .fa-quora:before { content: "\f2c4"; } .fa-square-x-twitter:before { content: "\e61a"; } .fa-reacteurope:before { content: "\f75d"; } .fa-medium:before { content: "\f23a"; } .fa-medium-m:before { content: "\f23a"; } .fa-amilia:before { content: "\f36d"; } .fa-mixcloud:before { content: "\f289"; } .fa-flipboard:before { content: "\f44d"; } .fa-viacoin:before { content: "\f237"; } .fa-critical-role:before { content: "\f6c9"; } .fa-sitrox:before { content: "\e44a"; } .fa-discourse:before { content: "\f393"; } .fa-joomla:before { content: "\f1aa"; } .fa-mastodon:before { content: "\f4f6"; } .fa-airbnb:before { content: "\f834"; } .fa-wolf-pack-battalion:before { content: "\f514"; } .fa-buy-n-large:before { content: "\f8a6"; } .fa-gulp:before { content: "\f3ae"; } .fa-creative-commons-sampling-plus:before { content: "\f4f1"; } .fa-strava:before { content: "\f428"; } .fa-ember:before { content: "\f423"; } .fa-canadian-maple-leaf:before { content: "\f785"; } .fa-teamspeak:before { content: "\f4f9"; } .fa-pushed:before { content: "\f3e1"; } .fa-wordpress-simple:before { content: "\f411"; } .fa-nutritionix:before { content: "\f3d6"; } .fa-wodu:before { content: "\e088"; } .fa-google-pay:before { content: "\e079"; } .fa-intercom:before { content: "\f7af"; } .fa-zhihu:before { content: "\f63f"; } .fa-korvue:before { content: "\f42f"; } .fa-pix:before { content: "\e43a"; } .fa-steam-symbol:before { content: "\f3f6"; } :root, :host { --fa-style-family-classic: 'Font Awesome 6 Free'; --fa-font-regular: normal 400 1em/1 'Font Awesome 6 Free'; } @font-face { font-family: 'Font Awesome 6 Free'; font-style: normal; font-weight: 400; font-display: block; src: url("../webfonts/fa-regular-400.woff2") format("woff2"), url("../webfonts/fa-regular-400.ttf") format("truetype"); } .far, .fa-regular { font-weight: 400; } :root, :host { --fa-style-family-classic: 'Font Awesome 6 Free'; --fa-font-solid: normal 900 1em/1 'Font Awesome 6 Free'; } @font-face { font-family: 'Font Awesome 6 Free'; font-style: normal; font-weight: 900; font-display: block; src: url("../webfonts/fa-solid-900.woff2") format("woff2"), url("../webfonts/fa-solid-900.ttf") format("truetype"); } .fas, .fa-solid { font-weight: 900; } @font-face { font-family: 'Font Awesome 5 Brands'; font-display: block; font-weight: 400; src: url("../webfonts/fa-brands-400.woff2") format("woff2"), url("../webfonts/fa-brands-400.ttf") format("truetype"); } @font-face { font-family: 'Font Awesome 5 Free'; font-display: block; font-weight: 900; src: url("../webfonts/fa-solid-900.woff2") format("woff2"), url("../webfonts/fa-solid-900.ttf") format("truetype"); } @font-face { font-family: 'Font Awesome 5 Free'; font-display: block; font-weight: 400; src: url("../webfonts/fa-regular-400.woff2") format("woff2"), url("../webfonts/fa-regular-400.ttf") format("truetype"); } @font-face { font-family: 'FontAwesome'; font-display: block; src: url("../webfonts/fa-solid-900.woff2") format("woff2"), url("../webfonts/fa-solid-900.ttf") format("truetype"); } @font-face { font-family: 'FontAwesome'; font-display: block; src: url("../webfonts/fa-brands-400.woff2") format("woff2"), url("../webfonts/fa-brands-400.ttf") format("truetype"); } @font-face { font-family: 'FontAwesome'; font-display: block; src: url("../webfonts/fa-regular-400.woff2") format("woff2"), url("../webfonts/fa-regular-400.ttf") format("truetype"); } @font-face { font-family: 'FontAwesome'; font-display: block; src: url("../webfonts/fa-v4compatibility.woff2") format("woff2"), url("../webfonts/fa-v4compatibility.ttf") format("truetype"); } fontawesome/inst/fontawesome/css/all.min.css0000644000176200001440000030755214605646413020766 0ustar liggesusers/*! * Font Awesome Free 6.5.2 by @fontawesome - https://fontawesome.com * License - https://fontawesome.com/license/free (Icons: CC BY 4.0, Fonts: SIL OFL 1.1, Code: MIT License) * Copyright 2024 Fonticons, Inc. */ .fa{font-family:var(--fa-style-family,"Font Awesome 6 Free");font-weight:var(--fa-style,900)}.fa,.fa-brands,.fa-classic,.fa-regular,.fa-sharp,.fa-solid,.fab,.far,.fas{-moz-osx-font-smoothing:grayscale;-webkit-font-smoothing:antialiased;display:var(--fa-display,inline-block);font-style:normal;font-variant:normal;line-height:1;text-rendering:auto}.fa-classic,.fa-regular,.fa-solid,.far,.fas{font-family:"Font Awesome 6 Free"}.fa-brands,.fab{font-family:"Font Awesome 6 Brands"}.fa-1x{font-size:1em}.fa-2x{font-size:2em}.fa-3x{font-size:3em}.fa-4x{font-size:4em}.fa-5x{font-size:5em}.fa-6x{font-size:6em}.fa-7x{font-size:7em}.fa-8x{font-size:8em}.fa-9x{font-size:9em}.fa-10x{font-size:10em}.fa-2xs{font-size:.625em;line-height:.1em;vertical-align:.225em}.fa-xs{font-size:.75em;line-height:.08333em;vertical-align:.125em}.fa-sm{font-size:.875em;line-height:.07143em;vertical-align:.05357em}.fa-lg{font-size:1.25em;line-height:.05em;vertical-align:-.075em}.fa-xl{font-size:1.5em;line-height:.04167em;vertical-align:-.125em}.fa-2xl{font-size:2em;line-height:.03125em;vertical-align:-.1875em}.fa-fw{text-align:center;width:1.25em}.fa-ul{list-style-type:none;margin-left:var(--fa-li-margin,2.5em);padding-left:0}.fa-ul>li{position:relative}.fa-li{left:calc(var(--fa-li-width, 2em)*-1);position:absolute;text-align:center;width:var(--fa-li-width,2em);line-height:inherit}.fa-border{border-radius:var(--fa-border-radius,.1em);border:var(--fa-border-width,.08em) var(--fa-border-style,solid) var(--fa-border-color,#eee);padding:var(--fa-border-padding,.2em .25em .15em)}.fa-pull-left{float:left;margin-right:var(--fa-pull-margin,.3em)}.fa-pull-right{float:right;margin-left:var(--fa-pull-margin,.3em)}.fa-beat{-webkit-animation-name:fa-beat;animation-name:fa-beat;-webkit-animation-delay:var(--fa-animation-delay,0s);animation-delay:var(--fa-animation-delay,0s);-webkit-animation-direction:var(--fa-animation-direction,normal);animation-direction:var(--fa-animation-direction,normal);-webkit-animation-duration:var(--fa-animation-duration,1s);animation-duration:var(--fa-animation-duration,1s);-webkit-animation-iteration-count:var(--fa-animation-iteration-count,infinite);animation-iteration-count:var(--fa-animation-iteration-count,infinite);-webkit-animation-timing-function:var(--fa-animation-timing,ease-in-out);animation-timing-function:var(--fa-animation-timing,ease-in-out)}.fa-bounce{-webkit-animation-name:fa-bounce;animation-name:fa-bounce;-webkit-animation-delay:var(--fa-animation-delay,0s);animation-delay:var(--fa-animation-delay,0s);-webkit-animation-direction:var(--fa-animation-direction,normal);animation-direction:var(--fa-animation-direction,normal);-webkit-animation-duration:var(--fa-animation-duration,1s);animation-duration:var(--fa-animation-duration,1s);-webkit-animation-iteration-count:var(--fa-animation-iteration-count,infinite);animation-iteration-count:var(--fa-animation-iteration-count,infinite);-webkit-animation-timing-function:var(--fa-animation-timing,cubic-bezier(.28,.84,.42,1));animation-timing-function:var(--fa-animation-timing,cubic-bezier(.28,.84,.42,1))}.fa-fade{-webkit-animation-name:fa-fade;animation-name:fa-fade;-webkit-animation-iteration-count:var(--fa-animation-iteration-count,infinite);animation-iteration-count:var(--fa-animation-iteration-count,infinite);-webkit-animation-timing-function:var(--fa-animation-timing,cubic-bezier(.4,0,.6,1));animation-timing-function:var(--fa-animation-timing,cubic-bezier(.4,0,.6,1))}.fa-beat-fade,.fa-fade{-webkit-animation-delay:var(--fa-animation-delay,0s);animation-delay:var(--fa-animation-delay,0s);-webkit-animation-direction:var(--fa-animation-direction,normal);animation-direction:var(--fa-animation-direction,normal);-webkit-animation-duration:var(--fa-animation-duration,1s);animation-duration:var(--fa-animation-duration,1s)}.fa-beat-fade{-webkit-animation-name:fa-beat-fade;animation-name:fa-beat-fade;-webkit-animation-iteration-count:var(--fa-animation-iteration-count,infinite);animation-iteration-count:var(--fa-animation-iteration-count,infinite);-webkit-animation-timing-function:var(--fa-animation-timing,cubic-bezier(.4,0,.6,1));animation-timing-function:var(--fa-animation-timing,cubic-bezier(.4,0,.6,1))}.fa-flip{-webkit-animation-name:fa-flip;animation-name:fa-flip;-webkit-animation-delay:var(--fa-animation-delay,0s);animation-delay:var(--fa-animation-delay,0s);-webkit-animation-direction:var(--fa-animation-direction,normal);animation-direction:var(--fa-animation-direction,normal);-webkit-animation-duration:var(--fa-animation-duration,1s);animation-duration:var(--fa-animation-duration,1s);-webkit-animation-iteration-count:var(--fa-animation-iteration-count,infinite);animation-iteration-count:var(--fa-animation-iteration-count,infinite);-webkit-animation-timing-function:var(--fa-animation-timing,ease-in-out);animation-timing-function:var(--fa-animation-timing,ease-in-out)}.fa-shake{-webkit-animation-name:fa-shake;animation-name:fa-shake;-webkit-animation-duration:var(--fa-animation-duration,1s);animation-duration:var(--fa-animation-duration,1s);-webkit-animation-iteration-count:var(--fa-animation-iteration-count,infinite);animation-iteration-count:var(--fa-animation-iteration-count,infinite);-webkit-animation-timing-function:var(--fa-animation-timing,linear);animation-timing-function:var(--fa-animation-timing,linear)}.fa-shake,.fa-spin{-webkit-animation-delay:var(--fa-animation-delay,0s);animation-delay:var(--fa-animation-delay,0s);-webkit-animation-direction:var(--fa-animation-direction,normal);animation-direction:var(--fa-animation-direction,normal)}.fa-spin{-webkit-animation-name:fa-spin;animation-name:fa-spin;-webkit-animation-duration:var(--fa-animation-duration,2s);animation-duration:var(--fa-animation-duration,2s);-webkit-animation-iteration-count:var(--fa-animation-iteration-count,infinite);animation-iteration-count:var(--fa-animation-iteration-count,infinite);-webkit-animation-timing-function:var(--fa-animation-timing,linear);animation-timing-function:var(--fa-animation-timing,linear)}.fa-spin-reverse{--fa-animation-direction:reverse}.fa-pulse,.fa-spin-pulse{-webkit-animation-name:fa-spin;animation-name:fa-spin;-webkit-animation-direction:var(--fa-animation-direction,normal);animation-direction:var(--fa-animation-direction,normal);-webkit-animation-duration:var(--fa-animation-duration,1s);animation-duration:var(--fa-animation-duration,1s);-webkit-animation-iteration-count:var(--fa-animation-iteration-count,infinite);animation-iteration-count:var(--fa-animation-iteration-count,infinite);-webkit-animation-timing-function:var(--fa-animation-timing,steps(8));animation-timing-function:var(--fa-animation-timing,steps(8))}@media (prefers-reduced-motion:reduce){.fa-beat,.fa-beat-fade,.fa-bounce,.fa-fade,.fa-flip,.fa-pulse,.fa-shake,.fa-spin,.fa-spin-pulse{-webkit-animation-delay:-1ms;animation-delay:-1ms;-webkit-animation-duration:1ms;animation-duration:1ms;-webkit-animation-iteration-count:1;animation-iteration-count:1;-webkit-transition-delay:0s;transition-delay:0s;-webkit-transition-duration:0s;transition-duration:0s}}@-webkit-keyframes fa-beat{0%,90%{-webkit-transform:scale(1);transform:scale(1)}45%{-webkit-transform:scale(var(--fa-beat-scale,1.25));transform:scale(var(--fa-beat-scale,1.25))}}@keyframes fa-beat{0%,90%{-webkit-transform:scale(1);transform:scale(1)}45%{-webkit-transform:scale(var(--fa-beat-scale,1.25));transform:scale(var(--fa-beat-scale,1.25))}}@-webkit-keyframes fa-bounce{0%{-webkit-transform:scale(1) translateY(0);transform:scale(1) translateY(0)}10%{-webkit-transform:scale(var(--fa-bounce-start-scale-x,1.1),var(--fa-bounce-start-scale-y,.9)) translateY(0);transform:scale(var(--fa-bounce-start-scale-x,1.1),var(--fa-bounce-start-scale-y,.9)) translateY(0)}30%{-webkit-transform:scale(var(--fa-bounce-jump-scale-x,.9),var(--fa-bounce-jump-scale-y,1.1)) translateY(var(--fa-bounce-height,-.5em));transform:scale(var(--fa-bounce-jump-scale-x,.9),var(--fa-bounce-jump-scale-y,1.1)) translateY(var(--fa-bounce-height,-.5em))}50%{-webkit-transform:scale(var(--fa-bounce-land-scale-x,1.05),var(--fa-bounce-land-scale-y,.95)) translateY(0);transform:scale(var(--fa-bounce-land-scale-x,1.05),var(--fa-bounce-land-scale-y,.95)) translateY(0)}57%{-webkit-transform:scale(1) translateY(var(--fa-bounce-rebound,-.125em));transform:scale(1) translateY(var(--fa-bounce-rebound,-.125em))}64%{-webkit-transform:scale(1) translateY(0);transform:scale(1) translateY(0)}to{-webkit-transform:scale(1) translateY(0);transform:scale(1) translateY(0)}}@keyframes fa-bounce{0%{-webkit-transform:scale(1) translateY(0);transform:scale(1) translateY(0)}10%{-webkit-transform:scale(var(--fa-bounce-start-scale-x,1.1),var(--fa-bounce-start-scale-y,.9)) translateY(0);transform:scale(var(--fa-bounce-start-scale-x,1.1),var(--fa-bounce-start-scale-y,.9)) translateY(0)}30%{-webkit-transform:scale(var(--fa-bounce-jump-scale-x,.9),var(--fa-bounce-jump-scale-y,1.1)) translateY(var(--fa-bounce-height,-.5em));transform:scale(var(--fa-bounce-jump-scale-x,.9),var(--fa-bounce-jump-scale-y,1.1)) translateY(var(--fa-bounce-height,-.5em))}50%{-webkit-transform:scale(var(--fa-bounce-land-scale-x,1.05),var(--fa-bounce-land-scale-y,.95)) translateY(0);transform:scale(var(--fa-bounce-land-scale-x,1.05),var(--fa-bounce-land-scale-y,.95)) translateY(0)}57%{-webkit-transform:scale(1) translateY(var(--fa-bounce-rebound,-.125em));transform:scale(1) translateY(var(--fa-bounce-rebound,-.125em))}64%{-webkit-transform:scale(1) translateY(0);transform:scale(1) translateY(0)}to{-webkit-transform:scale(1) translateY(0);transform:scale(1) translateY(0)}}@-webkit-keyframes fa-fade{50%{opacity:var(--fa-fade-opacity,.4)}}@keyframes fa-fade{50%{opacity:var(--fa-fade-opacity,.4)}}@-webkit-keyframes fa-beat-fade{0%,to{opacity:var(--fa-beat-fade-opacity,.4);-webkit-transform:scale(1);transform:scale(1)}50%{opacity:1;-webkit-transform:scale(var(--fa-beat-fade-scale,1.125));transform:scale(var(--fa-beat-fade-scale,1.125))}}@keyframes fa-beat-fade{0%,to{opacity:var(--fa-beat-fade-opacity,.4);-webkit-transform:scale(1);transform:scale(1)}50%{opacity:1;-webkit-transform:scale(var(--fa-beat-fade-scale,1.125));transform:scale(var(--fa-beat-fade-scale,1.125))}}@-webkit-keyframes fa-flip{50%{-webkit-transform:rotate3d(var(--fa-flip-x,0),var(--fa-flip-y,1),var(--fa-flip-z,0),var(--fa-flip-angle,-180deg));transform:rotate3d(var(--fa-flip-x,0),var(--fa-flip-y,1),var(--fa-flip-z,0),var(--fa-flip-angle,-180deg))}}@keyframes fa-flip{50%{-webkit-transform:rotate3d(var(--fa-flip-x,0),var(--fa-flip-y,1),var(--fa-flip-z,0),var(--fa-flip-angle,-180deg));transform:rotate3d(var(--fa-flip-x,0),var(--fa-flip-y,1),var(--fa-flip-z,0),var(--fa-flip-angle,-180deg))}}@-webkit-keyframes fa-shake{0%{-webkit-transform:rotate(-15deg);transform:rotate(-15deg)}4%{-webkit-transform:rotate(15deg);transform:rotate(15deg)}8%,24%{-webkit-transform:rotate(-18deg);transform:rotate(-18deg)}12%,28%{-webkit-transform:rotate(18deg);transform:rotate(18deg)}16%{-webkit-transform:rotate(-22deg);transform:rotate(-22deg)}20%{-webkit-transform:rotate(22deg);transform:rotate(22deg)}32%{-webkit-transform:rotate(-12deg);transform:rotate(-12deg)}36%{-webkit-transform:rotate(12deg);transform:rotate(12deg)}40%,to{-webkit-transform:rotate(0deg);transform:rotate(0deg)}}@keyframes fa-shake{0%{-webkit-transform:rotate(-15deg);transform:rotate(-15deg)}4%{-webkit-transform:rotate(15deg);transform:rotate(15deg)}8%,24%{-webkit-transform:rotate(-18deg);transform:rotate(-18deg)}12%,28%{-webkit-transform:rotate(18deg);transform:rotate(18deg)}16%{-webkit-transform:rotate(-22deg);transform:rotate(-22deg)}20%{-webkit-transform:rotate(22deg);transform:rotate(22deg)}32%{-webkit-transform:rotate(-12deg);transform:rotate(-12deg)}36%{-webkit-transform:rotate(12deg);transform:rotate(12deg)}40%,to{-webkit-transform:rotate(0deg);transform:rotate(0deg)}}@-webkit-keyframes fa-spin{0%{-webkit-transform:rotate(0deg);transform:rotate(0deg)}to{-webkit-transform:rotate(1turn);transform:rotate(1turn)}}@keyframes fa-spin{0%{-webkit-transform:rotate(0deg);transform:rotate(0deg)}to{-webkit-transform:rotate(1turn);transform:rotate(1turn)}}.fa-rotate-90{-webkit-transform:rotate(90deg);transform:rotate(90deg)}.fa-rotate-180{-webkit-transform:rotate(180deg);transform:rotate(180deg)}.fa-rotate-270{-webkit-transform:rotate(270deg);transform:rotate(270deg)}.fa-flip-horizontal{-webkit-transform:scaleX(-1);transform:scaleX(-1)}.fa-flip-vertical{-webkit-transform:scaleY(-1);transform:scaleY(-1)}.fa-flip-both,.fa-flip-horizontal.fa-flip-vertical{-webkit-transform:scale(-1);transform:scale(-1)}.fa-rotate-by{-webkit-transform:rotate(var(--fa-rotate-angle,0));transform:rotate(var(--fa-rotate-angle,0))}.fa-stack{display:inline-block;height:2em;line-height:2em;position:relative;vertical-align:middle;width:2.5em}.fa-stack-1x,.fa-stack-2x{left:0;position:absolute;text-align:center;width:100%;z-index:var(--fa-stack-z-index,auto)}.fa-stack-1x{line-height:inherit}.fa-stack-2x{font-size:2em}.fa-inverse{color:var(--fa-inverse,#fff)} .fa-0:before{content:"\30"}.fa-1:before{content:"\31"}.fa-2:before{content:"\32"}.fa-3:before{content:"\33"}.fa-4:before{content:"\34"}.fa-5:before{content:"\35"}.fa-6:before{content:"\36"}.fa-7:before{content:"\37"}.fa-8:before{content:"\38"}.fa-9:before{content:"\39"}.fa-fill-drip:before{content:"\f576"}.fa-arrows-to-circle:before{content:"\e4bd"}.fa-chevron-circle-right:before,.fa-circle-chevron-right:before{content:"\f138"}.fa-at:before{content:"\40"}.fa-trash-alt:before,.fa-trash-can:before{content:"\f2ed"}.fa-text-height:before{content:"\f034"}.fa-user-times:before,.fa-user-xmark:before{content:"\f235"}.fa-stethoscope:before{content:"\f0f1"}.fa-comment-alt:before,.fa-message:before{content:"\f27a"}.fa-info:before{content:"\f129"}.fa-compress-alt:before,.fa-down-left-and-up-right-to-center:before{content:"\f422"}.fa-explosion:before{content:"\e4e9"}.fa-file-alt:before,.fa-file-lines:before,.fa-file-text:before{content:"\f15c"}.fa-wave-square:before{content:"\f83e"}.fa-ring:before{content:"\f70b"}.fa-building-un:before{content:"\e4d9"}.fa-dice-three:before{content:"\f527"}.fa-calendar-alt:before,.fa-calendar-days:before{content:"\f073"}.fa-anchor-circle-check:before{content:"\e4aa"}.fa-building-circle-arrow-right:before{content:"\e4d1"}.fa-volleyball-ball:before,.fa-volleyball:before{content:"\f45f"}.fa-arrows-up-to-line:before{content:"\e4c2"}.fa-sort-desc:before,.fa-sort-down:before{content:"\f0dd"}.fa-circle-minus:before,.fa-minus-circle:before{content:"\f056"}.fa-door-open:before{content:"\f52b"}.fa-right-from-bracket:before,.fa-sign-out-alt:before{content:"\f2f5"}.fa-atom:before{content:"\f5d2"}.fa-soap:before{content:"\e06e"}.fa-heart-music-camera-bolt:before,.fa-icons:before{content:"\f86d"}.fa-microphone-alt-slash:before,.fa-microphone-lines-slash:before{content:"\f539"}.fa-bridge-circle-check:before{content:"\e4c9"}.fa-pump-medical:before{content:"\e06a"}.fa-fingerprint:before{content:"\f577"}.fa-hand-point-right:before{content:"\f0a4"}.fa-magnifying-glass-location:before,.fa-search-location:before{content:"\f689"}.fa-forward-step:before,.fa-step-forward:before{content:"\f051"}.fa-face-smile-beam:before,.fa-smile-beam:before{content:"\f5b8"}.fa-flag-checkered:before{content:"\f11e"}.fa-football-ball:before,.fa-football:before{content:"\f44e"}.fa-school-circle-exclamation:before{content:"\e56c"}.fa-crop:before{content:"\f125"}.fa-angle-double-down:before,.fa-angles-down:before{content:"\f103"}.fa-users-rectangle:before{content:"\e594"}.fa-people-roof:before{content:"\e537"}.fa-people-line:before{content:"\e534"}.fa-beer-mug-empty:before,.fa-beer:before{content:"\f0fc"}.fa-diagram-predecessor:before{content:"\e477"}.fa-arrow-up-long:before,.fa-long-arrow-up:before{content:"\f176"}.fa-burn:before,.fa-fire-flame-simple:before{content:"\f46a"}.fa-male:before,.fa-person:before{content:"\f183"}.fa-laptop:before{content:"\f109"}.fa-file-csv:before{content:"\f6dd"}.fa-menorah:before{content:"\f676"}.fa-truck-plane:before{content:"\e58f"}.fa-record-vinyl:before{content:"\f8d9"}.fa-face-grin-stars:before,.fa-grin-stars:before{content:"\f587"}.fa-bong:before{content:"\f55c"}.fa-pastafarianism:before,.fa-spaghetti-monster-flying:before{content:"\f67b"}.fa-arrow-down-up-across-line:before{content:"\e4af"}.fa-spoon:before,.fa-utensil-spoon:before{content:"\f2e5"}.fa-jar-wheat:before{content:"\e517"}.fa-envelopes-bulk:before,.fa-mail-bulk:before{content:"\f674"}.fa-file-circle-exclamation:before{content:"\e4eb"}.fa-circle-h:before,.fa-hospital-symbol:before{content:"\f47e"}.fa-pager:before{content:"\f815"}.fa-address-book:before,.fa-contact-book:before{content:"\f2b9"}.fa-strikethrough:before{content:"\f0cc"}.fa-k:before{content:"\4b"}.fa-landmark-flag:before{content:"\e51c"}.fa-pencil-alt:before,.fa-pencil:before{content:"\f303"}.fa-backward:before{content:"\f04a"}.fa-caret-right:before{content:"\f0da"}.fa-comments:before{content:"\f086"}.fa-file-clipboard:before,.fa-paste:before{content:"\f0ea"}.fa-code-pull-request:before{content:"\e13c"}.fa-clipboard-list:before{content:"\f46d"}.fa-truck-loading:before,.fa-truck-ramp-box:before{content:"\f4de"}.fa-user-check:before{content:"\f4fc"}.fa-vial-virus:before{content:"\e597"}.fa-sheet-plastic:before{content:"\e571"}.fa-blog:before{content:"\f781"}.fa-user-ninja:before{content:"\f504"}.fa-person-arrow-up-from-line:before{content:"\e539"}.fa-scroll-torah:before,.fa-torah:before{content:"\f6a0"}.fa-broom-ball:before,.fa-quidditch-broom-ball:before,.fa-quidditch:before{content:"\f458"}.fa-toggle-off:before{content:"\f204"}.fa-archive:before,.fa-box-archive:before{content:"\f187"}.fa-person-drowning:before{content:"\e545"}.fa-arrow-down-9-1:before,.fa-sort-numeric-desc:before,.fa-sort-numeric-down-alt:before{content:"\f886"}.fa-face-grin-tongue-squint:before,.fa-grin-tongue-squint:before{content:"\f58a"}.fa-spray-can:before{content:"\f5bd"}.fa-truck-monster:before{content:"\f63b"}.fa-w:before{content:"\57"}.fa-earth-africa:before,.fa-globe-africa:before{content:"\f57c"}.fa-rainbow:before{content:"\f75b"}.fa-circle-notch:before{content:"\f1ce"}.fa-tablet-alt:before,.fa-tablet-screen-button:before{content:"\f3fa"}.fa-paw:before{content:"\f1b0"}.fa-cloud:before{content:"\f0c2"}.fa-trowel-bricks:before{content:"\e58a"}.fa-face-flushed:before,.fa-flushed:before{content:"\f579"}.fa-hospital-user:before{content:"\f80d"}.fa-tent-arrow-left-right:before{content:"\e57f"}.fa-gavel:before,.fa-legal:before{content:"\f0e3"}.fa-binoculars:before{content:"\f1e5"}.fa-microphone-slash:before{content:"\f131"}.fa-box-tissue:before{content:"\e05b"}.fa-motorcycle:before{content:"\f21c"}.fa-bell-concierge:before,.fa-concierge-bell:before{content:"\f562"}.fa-pen-ruler:before,.fa-pencil-ruler:before{content:"\f5ae"}.fa-people-arrows-left-right:before,.fa-people-arrows:before{content:"\e068"}.fa-mars-and-venus-burst:before{content:"\e523"}.fa-caret-square-right:before,.fa-square-caret-right:before{content:"\f152"}.fa-cut:before,.fa-scissors:before{content:"\f0c4"}.fa-sun-plant-wilt:before{content:"\e57a"}.fa-toilets-portable:before{content:"\e584"}.fa-hockey-puck:before{content:"\f453"}.fa-table:before{content:"\f0ce"}.fa-magnifying-glass-arrow-right:before{content:"\e521"}.fa-digital-tachograph:before,.fa-tachograph-digital:before{content:"\f566"}.fa-users-slash:before{content:"\e073"}.fa-clover:before{content:"\e139"}.fa-mail-reply:before,.fa-reply:before{content:"\f3e5"}.fa-star-and-crescent:before{content:"\f699"}.fa-house-fire:before{content:"\e50c"}.fa-minus-square:before,.fa-square-minus:before{content:"\f146"}.fa-helicopter:before{content:"\f533"}.fa-compass:before{content:"\f14e"}.fa-caret-square-down:before,.fa-square-caret-down:before{content:"\f150"}.fa-file-circle-question:before{content:"\e4ef"}.fa-laptop-code:before{content:"\f5fc"}.fa-swatchbook:before{content:"\f5c3"}.fa-prescription-bottle:before{content:"\f485"}.fa-bars:before,.fa-navicon:before{content:"\f0c9"}.fa-people-group:before{content:"\e533"}.fa-hourglass-3:before,.fa-hourglass-end:before{content:"\f253"}.fa-heart-broken:before,.fa-heart-crack:before{content:"\f7a9"}.fa-external-link-square-alt:before,.fa-square-up-right:before{content:"\f360"}.fa-face-kiss-beam:before,.fa-kiss-beam:before{content:"\f597"}.fa-film:before{content:"\f008"}.fa-ruler-horizontal:before{content:"\f547"}.fa-people-robbery:before{content:"\e536"}.fa-lightbulb:before{content:"\f0eb"}.fa-caret-left:before{content:"\f0d9"}.fa-circle-exclamation:before,.fa-exclamation-circle:before{content:"\f06a"}.fa-school-circle-xmark:before{content:"\e56d"}.fa-arrow-right-from-bracket:before,.fa-sign-out:before{content:"\f08b"}.fa-chevron-circle-down:before,.fa-circle-chevron-down:before{content:"\f13a"}.fa-unlock-alt:before,.fa-unlock-keyhole:before{content:"\f13e"}.fa-cloud-showers-heavy:before{content:"\f740"}.fa-headphones-alt:before,.fa-headphones-simple:before{content:"\f58f"}.fa-sitemap:before{content:"\f0e8"}.fa-circle-dollar-to-slot:before,.fa-donate:before{content:"\f4b9"}.fa-memory:before{content:"\f538"}.fa-road-spikes:before{content:"\e568"}.fa-fire-burner:before{content:"\e4f1"}.fa-flag:before{content:"\f024"}.fa-hanukiah:before{content:"\f6e6"}.fa-feather:before{content:"\f52d"}.fa-volume-down:before,.fa-volume-low:before{content:"\f027"}.fa-comment-slash:before{content:"\f4b3"}.fa-cloud-sun-rain:before{content:"\f743"}.fa-compress:before{content:"\f066"}.fa-wheat-alt:before,.fa-wheat-awn:before{content:"\e2cd"}.fa-ankh:before{content:"\f644"}.fa-hands-holding-child:before{content:"\e4fa"}.fa-asterisk:before{content:"\2a"}.fa-check-square:before,.fa-square-check:before{content:"\f14a"}.fa-peseta-sign:before{content:"\e221"}.fa-header:before,.fa-heading:before{content:"\f1dc"}.fa-ghost:before{content:"\f6e2"}.fa-list-squares:before,.fa-list:before{content:"\f03a"}.fa-phone-square-alt:before,.fa-square-phone-flip:before{content:"\f87b"}.fa-cart-plus:before{content:"\f217"}.fa-gamepad:before{content:"\f11b"}.fa-circle-dot:before,.fa-dot-circle:before{content:"\f192"}.fa-dizzy:before,.fa-face-dizzy:before{content:"\f567"}.fa-egg:before{content:"\f7fb"}.fa-house-medical-circle-xmark:before{content:"\e513"}.fa-campground:before{content:"\f6bb"}.fa-folder-plus:before{content:"\f65e"}.fa-futbol-ball:before,.fa-futbol:before,.fa-soccer-ball:before{content:"\f1e3"}.fa-paint-brush:before,.fa-paintbrush:before{content:"\f1fc"}.fa-lock:before{content:"\f023"}.fa-gas-pump:before{content:"\f52f"}.fa-hot-tub-person:before,.fa-hot-tub:before{content:"\f593"}.fa-map-location:before,.fa-map-marked:before{content:"\f59f"}.fa-house-flood-water:before{content:"\e50e"}.fa-tree:before{content:"\f1bb"}.fa-bridge-lock:before{content:"\e4cc"}.fa-sack-dollar:before{content:"\f81d"}.fa-edit:before,.fa-pen-to-square:before{content:"\f044"}.fa-car-side:before{content:"\f5e4"}.fa-share-alt:before,.fa-share-nodes:before{content:"\f1e0"}.fa-heart-circle-minus:before{content:"\e4ff"}.fa-hourglass-2:before,.fa-hourglass-half:before{content:"\f252"}.fa-microscope:before{content:"\f610"}.fa-sink:before{content:"\e06d"}.fa-bag-shopping:before,.fa-shopping-bag:before{content:"\f290"}.fa-arrow-down-z-a:before,.fa-sort-alpha-desc:before,.fa-sort-alpha-down-alt:before{content:"\f881"}.fa-mitten:before{content:"\f7b5"}.fa-person-rays:before{content:"\e54d"}.fa-users:before{content:"\f0c0"}.fa-eye-slash:before{content:"\f070"}.fa-flask-vial:before{content:"\e4f3"}.fa-hand-paper:before,.fa-hand:before{content:"\f256"}.fa-om:before{content:"\f679"}.fa-worm:before{content:"\e599"}.fa-house-circle-xmark:before{content:"\e50b"}.fa-plug:before{content:"\f1e6"}.fa-chevron-up:before{content:"\f077"}.fa-hand-spock:before{content:"\f259"}.fa-stopwatch:before{content:"\f2f2"}.fa-face-kiss:before,.fa-kiss:before{content:"\f596"}.fa-bridge-circle-xmark:before{content:"\e4cb"}.fa-face-grin-tongue:before,.fa-grin-tongue:before{content:"\f589"}.fa-chess-bishop:before{content:"\f43a"}.fa-face-grin-wink:before,.fa-grin-wink:before{content:"\f58c"}.fa-deaf:before,.fa-deafness:before,.fa-ear-deaf:before,.fa-hard-of-hearing:before{content:"\f2a4"}.fa-road-circle-check:before{content:"\e564"}.fa-dice-five:before{content:"\f523"}.fa-rss-square:before,.fa-square-rss:before{content:"\f143"}.fa-land-mine-on:before{content:"\e51b"}.fa-i-cursor:before{content:"\f246"}.fa-stamp:before{content:"\f5bf"}.fa-stairs:before{content:"\e289"}.fa-i:before{content:"\49"}.fa-hryvnia-sign:before,.fa-hryvnia:before{content:"\f6f2"}.fa-pills:before{content:"\f484"}.fa-face-grin-wide:before,.fa-grin-alt:before{content:"\f581"}.fa-tooth:before{content:"\f5c9"}.fa-v:before{content:"\56"}.fa-bangladeshi-taka-sign:before{content:"\e2e6"}.fa-bicycle:before{content:"\f206"}.fa-rod-asclepius:before,.fa-rod-snake:before,.fa-staff-aesculapius:before,.fa-staff-snake:before{content:"\e579"}.fa-head-side-cough-slash:before{content:"\e062"}.fa-ambulance:before,.fa-truck-medical:before{content:"\f0f9"}.fa-wheat-awn-circle-exclamation:before{content:"\e598"}.fa-snowman:before{content:"\f7d0"}.fa-mortar-pestle:before{content:"\f5a7"}.fa-road-barrier:before{content:"\e562"}.fa-school:before{content:"\f549"}.fa-igloo:before{content:"\f7ae"}.fa-joint:before{content:"\f595"}.fa-angle-right:before{content:"\f105"}.fa-horse:before{content:"\f6f0"}.fa-q:before{content:"\51"}.fa-g:before{content:"\47"}.fa-notes-medical:before{content:"\f481"}.fa-temperature-2:before,.fa-temperature-half:before,.fa-thermometer-2:before,.fa-thermometer-half:before{content:"\f2c9"}.fa-dong-sign:before{content:"\e169"}.fa-capsules:before{content:"\f46b"}.fa-poo-bolt:before,.fa-poo-storm:before{content:"\f75a"}.fa-face-frown-open:before,.fa-frown-open:before{content:"\f57a"}.fa-hand-point-up:before{content:"\f0a6"}.fa-money-bill:before{content:"\f0d6"}.fa-bookmark:before{content:"\f02e"}.fa-align-justify:before{content:"\f039"}.fa-umbrella-beach:before{content:"\f5ca"}.fa-helmet-un:before{content:"\e503"}.fa-bullseye:before{content:"\f140"}.fa-bacon:before{content:"\f7e5"}.fa-hand-point-down:before{content:"\f0a7"}.fa-arrow-up-from-bracket:before{content:"\e09a"}.fa-folder-blank:before,.fa-folder:before{content:"\f07b"}.fa-file-medical-alt:before,.fa-file-waveform:before{content:"\f478"}.fa-radiation:before{content:"\f7b9"}.fa-chart-simple:before{content:"\e473"}.fa-mars-stroke:before{content:"\f229"}.fa-vial:before{content:"\f492"}.fa-dashboard:before,.fa-gauge-med:before,.fa-gauge:before,.fa-tachometer-alt-average:before{content:"\f624"}.fa-magic-wand-sparkles:before,.fa-wand-magic-sparkles:before{content:"\e2ca"}.fa-e:before{content:"\45"}.fa-pen-alt:before,.fa-pen-clip:before{content:"\f305"}.fa-bridge-circle-exclamation:before{content:"\e4ca"}.fa-user:before{content:"\f007"}.fa-school-circle-check:before{content:"\e56b"}.fa-dumpster:before{content:"\f793"}.fa-shuttle-van:before,.fa-van-shuttle:before{content:"\f5b6"}.fa-building-user:before{content:"\e4da"}.fa-caret-square-left:before,.fa-square-caret-left:before{content:"\f191"}.fa-highlighter:before{content:"\f591"}.fa-key:before{content:"\f084"}.fa-bullhorn:before{content:"\f0a1"}.fa-globe:before{content:"\f0ac"}.fa-synagogue:before{content:"\f69b"}.fa-person-half-dress:before{content:"\e548"}.fa-road-bridge:before{content:"\e563"}.fa-location-arrow:before{content:"\f124"}.fa-c:before{content:"\43"}.fa-tablet-button:before{content:"\f10a"}.fa-building-lock:before{content:"\e4d6"}.fa-pizza-slice:before{content:"\f818"}.fa-money-bill-wave:before{content:"\f53a"}.fa-area-chart:before,.fa-chart-area:before{content:"\f1fe"}.fa-house-flag:before{content:"\e50d"}.fa-person-circle-minus:before{content:"\e540"}.fa-ban:before,.fa-cancel:before{content:"\f05e"}.fa-camera-rotate:before{content:"\e0d8"}.fa-air-freshener:before,.fa-spray-can-sparkles:before{content:"\f5d0"}.fa-star:before{content:"\f005"}.fa-repeat:before{content:"\f363"}.fa-cross:before{content:"\f654"}.fa-box:before{content:"\f466"}.fa-venus-mars:before{content:"\f228"}.fa-arrow-pointer:before,.fa-mouse-pointer:before{content:"\f245"}.fa-expand-arrows-alt:before,.fa-maximize:before{content:"\f31e"}.fa-charging-station:before{content:"\f5e7"}.fa-shapes:before,.fa-triangle-circle-square:before{content:"\f61f"}.fa-random:before,.fa-shuffle:before{content:"\f074"}.fa-person-running:before,.fa-running:before{content:"\f70c"}.fa-mobile-retro:before{content:"\e527"}.fa-grip-lines-vertical:before{content:"\f7a5"}.fa-spider:before{content:"\f717"}.fa-hands-bound:before{content:"\e4f9"}.fa-file-invoice-dollar:before{content:"\f571"}.fa-plane-circle-exclamation:before{content:"\e556"}.fa-x-ray:before{content:"\f497"}.fa-spell-check:before{content:"\f891"}.fa-slash:before{content:"\f715"}.fa-computer-mouse:before,.fa-mouse:before{content:"\f8cc"}.fa-arrow-right-to-bracket:before,.fa-sign-in:before{content:"\f090"}.fa-shop-slash:before,.fa-store-alt-slash:before{content:"\e070"}.fa-server:before{content:"\f233"}.fa-virus-covid-slash:before{content:"\e4a9"}.fa-shop-lock:before{content:"\e4a5"}.fa-hourglass-1:before,.fa-hourglass-start:before{content:"\f251"}.fa-blender-phone:before{content:"\f6b6"}.fa-building-wheat:before{content:"\e4db"}.fa-person-breastfeeding:before{content:"\e53a"}.fa-right-to-bracket:before,.fa-sign-in-alt:before{content:"\f2f6"}.fa-venus:before{content:"\f221"}.fa-passport:before{content:"\f5ab"}.fa-heart-pulse:before,.fa-heartbeat:before{content:"\f21e"}.fa-people-carry-box:before,.fa-people-carry:before{content:"\f4ce"}.fa-temperature-high:before{content:"\f769"}.fa-microchip:before{content:"\f2db"}.fa-crown:before{content:"\f521"}.fa-weight-hanging:before{content:"\f5cd"}.fa-xmarks-lines:before{content:"\e59a"}.fa-file-prescription:before{content:"\f572"}.fa-weight-scale:before,.fa-weight:before{content:"\f496"}.fa-user-friends:before,.fa-user-group:before{content:"\f500"}.fa-arrow-up-a-z:before,.fa-sort-alpha-up:before{content:"\f15e"}.fa-chess-knight:before{content:"\f441"}.fa-face-laugh-squint:before,.fa-laugh-squint:before{content:"\f59b"}.fa-wheelchair:before{content:"\f193"}.fa-arrow-circle-up:before,.fa-circle-arrow-up:before{content:"\f0aa"}.fa-toggle-on:before{content:"\f205"}.fa-person-walking:before,.fa-walking:before{content:"\f554"}.fa-l:before{content:"\4c"}.fa-fire:before{content:"\f06d"}.fa-bed-pulse:before,.fa-procedures:before{content:"\f487"}.fa-shuttle-space:before,.fa-space-shuttle:before{content:"\f197"}.fa-face-laugh:before,.fa-laugh:before{content:"\f599"}.fa-folder-open:before{content:"\f07c"}.fa-heart-circle-plus:before{content:"\e500"}.fa-code-fork:before{content:"\e13b"}.fa-city:before{content:"\f64f"}.fa-microphone-alt:before,.fa-microphone-lines:before{content:"\f3c9"}.fa-pepper-hot:before{content:"\f816"}.fa-unlock:before{content:"\f09c"}.fa-colon-sign:before{content:"\e140"}.fa-headset:before{content:"\f590"}.fa-store-slash:before{content:"\e071"}.fa-road-circle-xmark:before{content:"\e566"}.fa-user-minus:before{content:"\f503"}.fa-mars-stroke-up:before,.fa-mars-stroke-v:before{content:"\f22a"}.fa-champagne-glasses:before,.fa-glass-cheers:before{content:"\f79f"}.fa-clipboard:before{content:"\f328"}.fa-house-circle-exclamation:before{content:"\e50a"}.fa-file-arrow-up:before,.fa-file-upload:before{content:"\f574"}.fa-wifi-3:before,.fa-wifi-strong:before,.fa-wifi:before{content:"\f1eb"}.fa-bath:before,.fa-bathtub:before{content:"\f2cd"}.fa-underline:before{content:"\f0cd"}.fa-user-edit:before,.fa-user-pen:before{content:"\f4ff"}.fa-signature:before{content:"\f5b7"}.fa-stroopwafel:before{content:"\f551"}.fa-bold:before{content:"\f032"}.fa-anchor-lock:before{content:"\e4ad"}.fa-building-ngo:before{content:"\e4d7"}.fa-manat-sign:before{content:"\e1d5"}.fa-not-equal:before{content:"\f53e"}.fa-border-style:before,.fa-border-top-left:before{content:"\f853"}.fa-map-location-dot:before,.fa-map-marked-alt:before{content:"\f5a0"}.fa-jedi:before{content:"\f669"}.fa-poll:before,.fa-square-poll-vertical:before{content:"\f681"}.fa-mug-hot:before{content:"\f7b6"}.fa-battery-car:before,.fa-car-battery:before{content:"\f5df"}.fa-gift:before{content:"\f06b"}.fa-dice-two:before{content:"\f528"}.fa-chess-queen:before{content:"\f445"}.fa-glasses:before{content:"\f530"}.fa-chess-board:before{content:"\f43c"}.fa-building-circle-check:before{content:"\e4d2"}.fa-person-chalkboard:before{content:"\e53d"}.fa-mars-stroke-h:before,.fa-mars-stroke-right:before{content:"\f22b"}.fa-hand-back-fist:before,.fa-hand-rock:before{content:"\f255"}.fa-caret-square-up:before,.fa-square-caret-up:before{content:"\f151"}.fa-cloud-showers-water:before{content:"\e4e4"}.fa-bar-chart:before,.fa-chart-bar:before{content:"\f080"}.fa-hands-bubbles:before,.fa-hands-wash:before{content:"\e05e"}.fa-less-than-equal:before{content:"\f537"}.fa-train:before{content:"\f238"}.fa-eye-low-vision:before,.fa-low-vision:before{content:"\f2a8"}.fa-crow:before{content:"\f520"}.fa-sailboat:before{content:"\e445"}.fa-window-restore:before{content:"\f2d2"}.fa-plus-square:before,.fa-square-plus:before{content:"\f0fe"}.fa-torii-gate:before{content:"\f6a1"}.fa-frog:before{content:"\f52e"}.fa-bucket:before{content:"\e4cf"}.fa-image:before{content:"\f03e"}.fa-microphone:before{content:"\f130"}.fa-cow:before{content:"\f6c8"}.fa-caret-up:before{content:"\f0d8"}.fa-screwdriver:before{content:"\f54a"}.fa-folder-closed:before{content:"\e185"}.fa-house-tsunami:before{content:"\e515"}.fa-square-nfi:before{content:"\e576"}.fa-arrow-up-from-ground-water:before{content:"\e4b5"}.fa-glass-martini-alt:before,.fa-martini-glass:before{content:"\f57b"}.fa-rotate-back:before,.fa-rotate-backward:before,.fa-rotate-left:before,.fa-undo-alt:before{content:"\f2ea"}.fa-columns:before,.fa-table-columns:before{content:"\f0db"}.fa-lemon:before{content:"\f094"}.fa-head-side-mask:before{content:"\e063"}.fa-handshake:before{content:"\f2b5"}.fa-gem:before{content:"\f3a5"}.fa-dolly-box:before,.fa-dolly:before{content:"\f472"}.fa-smoking:before{content:"\f48d"}.fa-compress-arrows-alt:before,.fa-minimize:before{content:"\f78c"}.fa-monument:before{content:"\f5a6"}.fa-snowplow:before{content:"\f7d2"}.fa-angle-double-right:before,.fa-angles-right:before{content:"\f101"}.fa-cannabis:before{content:"\f55f"}.fa-circle-play:before,.fa-play-circle:before{content:"\f144"}.fa-tablets:before{content:"\f490"}.fa-ethernet:before{content:"\f796"}.fa-eur:before,.fa-euro-sign:before,.fa-euro:before{content:"\f153"}.fa-chair:before{content:"\f6c0"}.fa-check-circle:before,.fa-circle-check:before{content:"\f058"}.fa-circle-stop:before,.fa-stop-circle:before{content:"\f28d"}.fa-compass-drafting:before,.fa-drafting-compass:before{content:"\f568"}.fa-plate-wheat:before{content:"\e55a"}.fa-icicles:before{content:"\f7ad"}.fa-person-shelter:before{content:"\e54f"}.fa-neuter:before{content:"\f22c"}.fa-id-badge:before{content:"\f2c1"}.fa-marker:before{content:"\f5a1"}.fa-face-laugh-beam:before,.fa-laugh-beam:before{content:"\f59a"}.fa-helicopter-symbol:before{content:"\e502"}.fa-universal-access:before{content:"\f29a"}.fa-chevron-circle-up:before,.fa-circle-chevron-up:before{content:"\f139"}.fa-lari-sign:before{content:"\e1c8"}.fa-volcano:before{content:"\f770"}.fa-person-walking-dashed-line-arrow-right:before{content:"\e553"}.fa-gbp:before,.fa-pound-sign:before,.fa-sterling-sign:before{content:"\f154"}.fa-viruses:before{content:"\e076"}.fa-square-person-confined:before{content:"\e577"}.fa-user-tie:before{content:"\f508"}.fa-arrow-down-long:before,.fa-long-arrow-down:before{content:"\f175"}.fa-tent-arrow-down-to-line:before{content:"\e57e"}.fa-certificate:before{content:"\f0a3"}.fa-mail-reply-all:before,.fa-reply-all:before{content:"\f122"}.fa-suitcase:before{content:"\f0f2"}.fa-person-skating:before,.fa-skating:before{content:"\f7c5"}.fa-filter-circle-dollar:before,.fa-funnel-dollar:before{content:"\f662"}.fa-camera-retro:before{content:"\f083"}.fa-arrow-circle-down:before,.fa-circle-arrow-down:before{content:"\f0ab"}.fa-arrow-right-to-file:before,.fa-file-import:before{content:"\f56f"}.fa-external-link-square:before,.fa-square-arrow-up-right:before{content:"\f14c"}.fa-box-open:before{content:"\f49e"}.fa-scroll:before{content:"\f70e"}.fa-spa:before{content:"\f5bb"}.fa-location-pin-lock:before{content:"\e51f"}.fa-pause:before{content:"\f04c"}.fa-hill-avalanche:before{content:"\e507"}.fa-temperature-0:before,.fa-temperature-empty:before,.fa-thermometer-0:before,.fa-thermometer-empty:before{content:"\f2cb"}.fa-bomb:before{content:"\f1e2"}.fa-registered:before{content:"\f25d"}.fa-address-card:before,.fa-contact-card:before,.fa-vcard:before{content:"\f2bb"}.fa-balance-scale-right:before,.fa-scale-unbalanced-flip:before{content:"\f516"}.fa-subscript:before{content:"\f12c"}.fa-diamond-turn-right:before,.fa-directions:before{content:"\f5eb"}.fa-burst:before{content:"\e4dc"}.fa-house-laptop:before,.fa-laptop-house:before{content:"\e066"}.fa-face-tired:before,.fa-tired:before{content:"\f5c8"}.fa-money-bills:before{content:"\e1f3"}.fa-smog:before{content:"\f75f"}.fa-crutch:before{content:"\f7f7"}.fa-cloud-arrow-up:before,.fa-cloud-upload-alt:before,.fa-cloud-upload:before{content:"\f0ee"}.fa-palette:before{content:"\f53f"}.fa-arrows-turn-right:before{content:"\e4c0"}.fa-vest:before{content:"\e085"}.fa-ferry:before{content:"\e4ea"}.fa-arrows-down-to-people:before{content:"\e4b9"}.fa-seedling:before,.fa-sprout:before{content:"\f4d8"}.fa-arrows-alt-h:before,.fa-left-right:before{content:"\f337"}.fa-boxes-packing:before{content:"\e4c7"}.fa-arrow-circle-left:before,.fa-circle-arrow-left:before{content:"\f0a8"}.fa-group-arrows-rotate:before{content:"\e4f6"}.fa-bowl-food:before{content:"\e4c6"}.fa-candy-cane:before{content:"\f786"}.fa-arrow-down-wide-short:before,.fa-sort-amount-asc:before,.fa-sort-amount-down:before{content:"\f160"}.fa-cloud-bolt:before,.fa-thunderstorm:before{content:"\f76c"}.fa-remove-format:before,.fa-text-slash:before{content:"\f87d"}.fa-face-smile-wink:before,.fa-smile-wink:before{content:"\f4da"}.fa-file-word:before{content:"\f1c2"}.fa-file-powerpoint:before{content:"\f1c4"}.fa-arrows-h:before,.fa-arrows-left-right:before{content:"\f07e"}.fa-house-lock:before{content:"\e510"}.fa-cloud-arrow-down:before,.fa-cloud-download-alt:before,.fa-cloud-download:before{content:"\f0ed"}.fa-children:before{content:"\e4e1"}.fa-blackboard:before,.fa-chalkboard:before{content:"\f51b"}.fa-user-alt-slash:before,.fa-user-large-slash:before{content:"\f4fa"}.fa-envelope-open:before{content:"\f2b6"}.fa-handshake-alt-slash:before,.fa-handshake-simple-slash:before{content:"\e05f"}.fa-mattress-pillow:before{content:"\e525"}.fa-guarani-sign:before{content:"\e19a"}.fa-arrows-rotate:before,.fa-refresh:before,.fa-sync:before{content:"\f021"}.fa-fire-extinguisher:before{content:"\f134"}.fa-cruzeiro-sign:before{content:"\e152"}.fa-greater-than-equal:before{content:"\f532"}.fa-shield-alt:before,.fa-shield-halved:before{content:"\f3ed"}.fa-atlas:before,.fa-book-atlas:before{content:"\f558"}.fa-virus:before{content:"\e074"}.fa-envelope-circle-check:before{content:"\e4e8"}.fa-layer-group:before{content:"\f5fd"}.fa-arrows-to-dot:before{content:"\e4be"}.fa-archway:before{content:"\f557"}.fa-heart-circle-check:before{content:"\e4fd"}.fa-house-chimney-crack:before,.fa-house-damage:before{content:"\f6f1"}.fa-file-archive:before,.fa-file-zipper:before{content:"\f1c6"}.fa-square:before{content:"\f0c8"}.fa-glass-martini:before,.fa-martini-glass-empty:before{content:"\f000"}.fa-couch:before{content:"\f4b8"}.fa-cedi-sign:before{content:"\e0df"}.fa-italic:before{content:"\f033"}.fa-table-cells-column-lock:before{content:"\e678"}.fa-church:before{content:"\f51d"}.fa-comments-dollar:before{content:"\f653"}.fa-democrat:before{content:"\f747"}.fa-z:before{content:"\5a"}.fa-person-skiing:before,.fa-skiing:before{content:"\f7c9"}.fa-road-lock:before{content:"\e567"}.fa-a:before{content:"\41"}.fa-temperature-arrow-down:before,.fa-temperature-down:before{content:"\e03f"}.fa-feather-alt:before,.fa-feather-pointed:before{content:"\f56b"}.fa-p:before{content:"\50"}.fa-snowflake:before{content:"\f2dc"}.fa-newspaper:before{content:"\f1ea"}.fa-ad:before,.fa-rectangle-ad:before{content:"\f641"}.fa-arrow-circle-right:before,.fa-circle-arrow-right:before{content:"\f0a9"}.fa-filter-circle-xmark:before{content:"\e17b"}.fa-locust:before{content:"\e520"}.fa-sort:before,.fa-unsorted:before{content:"\f0dc"}.fa-list-1-2:before,.fa-list-numeric:before,.fa-list-ol:before{content:"\f0cb"}.fa-person-dress-burst:before{content:"\e544"}.fa-money-check-alt:before,.fa-money-check-dollar:before{content:"\f53d"}.fa-vector-square:before{content:"\f5cb"}.fa-bread-slice:before{content:"\f7ec"}.fa-language:before{content:"\f1ab"}.fa-face-kiss-wink-heart:before,.fa-kiss-wink-heart:before{content:"\f598"}.fa-filter:before{content:"\f0b0"}.fa-question:before{content:"\3f"}.fa-file-signature:before{content:"\f573"}.fa-arrows-alt:before,.fa-up-down-left-right:before{content:"\f0b2"}.fa-house-chimney-user:before{content:"\e065"}.fa-hand-holding-heart:before{content:"\f4be"}.fa-puzzle-piece:before{content:"\f12e"}.fa-money-check:before{content:"\f53c"}.fa-star-half-alt:before,.fa-star-half-stroke:before{content:"\f5c0"}.fa-code:before{content:"\f121"}.fa-glass-whiskey:before,.fa-whiskey-glass:before{content:"\f7a0"}.fa-building-circle-exclamation:before{content:"\e4d3"}.fa-magnifying-glass-chart:before{content:"\e522"}.fa-arrow-up-right-from-square:before,.fa-external-link:before{content:"\f08e"}.fa-cubes-stacked:before{content:"\e4e6"}.fa-krw:before,.fa-won-sign:before,.fa-won:before{content:"\f159"}.fa-virus-covid:before{content:"\e4a8"}.fa-austral-sign:before{content:"\e0a9"}.fa-f:before{content:"\46"}.fa-leaf:before{content:"\f06c"}.fa-road:before{content:"\f018"}.fa-cab:before,.fa-taxi:before{content:"\f1ba"}.fa-person-circle-plus:before{content:"\e541"}.fa-chart-pie:before,.fa-pie-chart:before{content:"\f200"}.fa-bolt-lightning:before{content:"\e0b7"}.fa-sack-xmark:before{content:"\e56a"}.fa-file-excel:before{content:"\f1c3"}.fa-file-contract:before{content:"\f56c"}.fa-fish-fins:before{content:"\e4f2"}.fa-building-flag:before{content:"\e4d5"}.fa-face-grin-beam:before,.fa-grin-beam:before{content:"\f582"}.fa-object-ungroup:before{content:"\f248"}.fa-poop:before{content:"\f619"}.fa-location-pin:before,.fa-map-marker:before{content:"\f041"}.fa-kaaba:before{content:"\f66b"}.fa-toilet-paper:before{content:"\f71e"}.fa-hard-hat:before,.fa-hat-hard:before,.fa-helmet-safety:before{content:"\f807"}.fa-eject:before{content:"\f052"}.fa-arrow-alt-circle-right:before,.fa-circle-right:before{content:"\f35a"}.fa-plane-circle-check:before{content:"\e555"}.fa-face-rolling-eyes:before,.fa-meh-rolling-eyes:before{content:"\f5a5"}.fa-object-group:before{content:"\f247"}.fa-chart-line:before,.fa-line-chart:before{content:"\f201"}.fa-mask-ventilator:before{content:"\e524"}.fa-arrow-right:before{content:"\f061"}.fa-map-signs:before,.fa-signs-post:before{content:"\f277"}.fa-cash-register:before{content:"\f788"}.fa-person-circle-question:before{content:"\e542"}.fa-h:before{content:"\48"}.fa-tarp:before{content:"\e57b"}.fa-screwdriver-wrench:before,.fa-tools:before{content:"\f7d9"}.fa-arrows-to-eye:before{content:"\e4bf"}.fa-plug-circle-bolt:before{content:"\e55b"}.fa-heart:before{content:"\f004"}.fa-mars-and-venus:before{content:"\f224"}.fa-home-user:before,.fa-house-user:before{content:"\e1b0"}.fa-dumpster-fire:before{content:"\f794"}.fa-house-crack:before{content:"\e3b1"}.fa-cocktail:before,.fa-martini-glass-citrus:before{content:"\f561"}.fa-face-surprise:before,.fa-surprise:before{content:"\f5c2"}.fa-bottle-water:before{content:"\e4c5"}.fa-circle-pause:before,.fa-pause-circle:before{content:"\f28b"}.fa-toilet-paper-slash:before{content:"\e072"}.fa-apple-alt:before,.fa-apple-whole:before{content:"\f5d1"}.fa-kitchen-set:before{content:"\e51a"}.fa-r:before{content:"\52"}.fa-temperature-1:before,.fa-temperature-quarter:before,.fa-thermometer-1:before,.fa-thermometer-quarter:before{content:"\f2ca"}.fa-cube:before{content:"\f1b2"}.fa-bitcoin-sign:before{content:"\e0b4"}.fa-shield-dog:before{content:"\e573"}.fa-solar-panel:before{content:"\f5ba"}.fa-lock-open:before{content:"\f3c1"}.fa-elevator:before{content:"\e16d"}.fa-money-bill-transfer:before{content:"\e528"}.fa-money-bill-trend-up:before{content:"\e529"}.fa-house-flood-water-circle-arrow-right:before{content:"\e50f"}.fa-poll-h:before,.fa-square-poll-horizontal:before{content:"\f682"}.fa-circle:before{content:"\f111"}.fa-backward-fast:before,.fa-fast-backward:before{content:"\f049"}.fa-recycle:before{content:"\f1b8"}.fa-user-astronaut:before{content:"\f4fb"}.fa-plane-slash:before{content:"\e069"}.fa-trademark:before{content:"\f25c"}.fa-basketball-ball:before,.fa-basketball:before{content:"\f434"}.fa-satellite-dish:before{content:"\f7c0"}.fa-arrow-alt-circle-up:before,.fa-circle-up:before{content:"\f35b"}.fa-mobile-alt:before,.fa-mobile-screen-button:before{content:"\f3cd"}.fa-volume-high:before,.fa-volume-up:before{content:"\f028"}.fa-users-rays:before{content:"\e593"}.fa-wallet:before{content:"\f555"}.fa-clipboard-check:before{content:"\f46c"}.fa-file-audio:before{content:"\f1c7"}.fa-burger:before,.fa-hamburger:before{content:"\f805"}.fa-wrench:before{content:"\f0ad"}.fa-bugs:before{content:"\e4d0"}.fa-rupee-sign:before,.fa-rupee:before{content:"\f156"}.fa-file-image:before{content:"\f1c5"}.fa-circle-question:before,.fa-question-circle:before{content:"\f059"}.fa-plane-departure:before{content:"\f5b0"}.fa-handshake-slash:before{content:"\e060"}.fa-book-bookmark:before{content:"\e0bb"}.fa-code-branch:before{content:"\f126"}.fa-hat-cowboy:before{content:"\f8c0"}.fa-bridge:before{content:"\e4c8"}.fa-phone-alt:before,.fa-phone-flip:before{content:"\f879"}.fa-truck-front:before{content:"\e2b7"}.fa-cat:before{content:"\f6be"}.fa-anchor-circle-exclamation:before{content:"\e4ab"}.fa-truck-field:before{content:"\e58d"}.fa-route:before{content:"\f4d7"}.fa-clipboard-question:before{content:"\e4e3"}.fa-panorama:before{content:"\e209"}.fa-comment-medical:before{content:"\f7f5"}.fa-teeth-open:before{content:"\f62f"}.fa-file-circle-minus:before{content:"\e4ed"}.fa-tags:before{content:"\f02c"}.fa-wine-glass:before{content:"\f4e3"}.fa-fast-forward:before,.fa-forward-fast:before{content:"\f050"}.fa-face-meh-blank:before,.fa-meh-blank:before{content:"\f5a4"}.fa-parking:before,.fa-square-parking:before{content:"\f540"}.fa-house-signal:before{content:"\e012"}.fa-bars-progress:before,.fa-tasks-alt:before{content:"\f828"}.fa-faucet-drip:before{content:"\e006"}.fa-cart-flatbed:before,.fa-dolly-flatbed:before{content:"\f474"}.fa-ban-smoking:before,.fa-smoking-ban:before{content:"\f54d"}.fa-terminal:before{content:"\f120"}.fa-mobile-button:before{content:"\f10b"}.fa-house-medical-flag:before{content:"\e514"}.fa-basket-shopping:before,.fa-shopping-basket:before{content:"\f291"}.fa-tape:before{content:"\f4db"}.fa-bus-alt:before,.fa-bus-simple:before{content:"\f55e"}.fa-eye:before{content:"\f06e"}.fa-face-sad-cry:before,.fa-sad-cry:before{content:"\f5b3"}.fa-audio-description:before{content:"\f29e"}.fa-person-military-to-person:before{content:"\e54c"}.fa-file-shield:before{content:"\e4f0"}.fa-user-slash:before{content:"\f506"}.fa-pen:before{content:"\f304"}.fa-tower-observation:before{content:"\e586"}.fa-file-code:before{content:"\f1c9"}.fa-signal-5:before,.fa-signal-perfect:before,.fa-signal:before{content:"\f012"}.fa-bus:before{content:"\f207"}.fa-heart-circle-xmark:before{content:"\e501"}.fa-home-lg:before,.fa-house-chimney:before{content:"\e3af"}.fa-window-maximize:before{content:"\f2d0"}.fa-face-frown:before,.fa-frown:before{content:"\f119"}.fa-prescription:before{content:"\f5b1"}.fa-shop:before,.fa-store-alt:before{content:"\f54f"}.fa-floppy-disk:before,.fa-save:before{content:"\f0c7"}.fa-vihara:before{content:"\f6a7"}.fa-balance-scale-left:before,.fa-scale-unbalanced:before{content:"\f515"}.fa-sort-asc:before,.fa-sort-up:before{content:"\f0de"}.fa-comment-dots:before,.fa-commenting:before{content:"\f4ad"}.fa-plant-wilt:before{content:"\e5aa"}.fa-diamond:before{content:"\f219"}.fa-face-grin-squint:before,.fa-grin-squint:before{content:"\f585"}.fa-hand-holding-dollar:before,.fa-hand-holding-usd:before{content:"\f4c0"}.fa-bacterium:before{content:"\e05a"}.fa-hand-pointer:before{content:"\f25a"}.fa-drum-steelpan:before{content:"\f56a"}.fa-hand-scissors:before{content:"\f257"}.fa-hands-praying:before,.fa-praying-hands:before{content:"\f684"}.fa-arrow-right-rotate:before,.fa-arrow-rotate-forward:before,.fa-arrow-rotate-right:before,.fa-redo:before{content:"\f01e"}.fa-biohazard:before{content:"\f780"}.fa-location-crosshairs:before,.fa-location:before{content:"\f601"}.fa-mars-double:before{content:"\f227"}.fa-child-dress:before{content:"\e59c"}.fa-users-between-lines:before{content:"\e591"}.fa-lungs-virus:before{content:"\e067"}.fa-face-grin-tears:before,.fa-grin-tears:before{content:"\f588"}.fa-phone:before{content:"\f095"}.fa-calendar-times:before,.fa-calendar-xmark:before{content:"\f273"}.fa-child-reaching:before{content:"\e59d"}.fa-head-side-virus:before{content:"\e064"}.fa-user-cog:before,.fa-user-gear:before{content:"\f4fe"}.fa-arrow-up-1-9:before,.fa-sort-numeric-up:before{content:"\f163"}.fa-door-closed:before{content:"\f52a"}.fa-shield-virus:before{content:"\e06c"}.fa-dice-six:before{content:"\f526"}.fa-mosquito-net:before{content:"\e52c"}.fa-bridge-water:before{content:"\e4ce"}.fa-person-booth:before{content:"\f756"}.fa-text-width:before{content:"\f035"}.fa-hat-wizard:before{content:"\f6e8"}.fa-pen-fancy:before{content:"\f5ac"}.fa-digging:before,.fa-person-digging:before{content:"\f85e"}.fa-trash:before{content:"\f1f8"}.fa-gauge-simple-med:before,.fa-gauge-simple:before,.fa-tachometer-average:before{content:"\f629"}.fa-book-medical:before{content:"\f7e6"}.fa-poo:before{content:"\f2fe"}.fa-quote-right-alt:before,.fa-quote-right:before{content:"\f10e"}.fa-shirt:before,.fa-t-shirt:before,.fa-tshirt:before{content:"\f553"}.fa-cubes:before{content:"\f1b3"}.fa-divide:before{content:"\f529"}.fa-tenge-sign:before,.fa-tenge:before{content:"\f7d7"}.fa-headphones:before{content:"\f025"}.fa-hands-holding:before{content:"\f4c2"}.fa-hands-clapping:before{content:"\e1a8"}.fa-republican:before{content:"\f75e"}.fa-arrow-left:before{content:"\f060"}.fa-person-circle-xmark:before{content:"\e543"}.fa-ruler:before{content:"\f545"}.fa-align-left:before{content:"\f036"}.fa-dice-d6:before{content:"\f6d1"}.fa-restroom:before{content:"\f7bd"}.fa-j:before{content:"\4a"}.fa-users-viewfinder:before{content:"\e595"}.fa-file-video:before{content:"\f1c8"}.fa-external-link-alt:before,.fa-up-right-from-square:before{content:"\f35d"}.fa-table-cells:before,.fa-th:before{content:"\f00a"}.fa-file-pdf:before{content:"\f1c1"}.fa-bible:before,.fa-book-bible:before{content:"\f647"}.fa-o:before{content:"\4f"}.fa-medkit:before,.fa-suitcase-medical:before{content:"\f0fa"}.fa-user-secret:before{content:"\f21b"}.fa-otter:before{content:"\f700"}.fa-female:before,.fa-person-dress:before{content:"\f182"}.fa-comment-dollar:before{content:"\f651"}.fa-briefcase-clock:before,.fa-business-time:before{content:"\f64a"}.fa-table-cells-large:before,.fa-th-large:before{content:"\f009"}.fa-book-tanakh:before,.fa-tanakh:before{content:"\f827"}.fa-phone-volume:before,.fa-volume-control-phone:before{content:"\f2a0"}.fa-hat-cowboy-side:before{content:"\f8c1"}.fa-clipboard-user:before{content:"\f7f3"}.fa-child:before{content:"\f1ae"}.fa-lira-sign:before{content:"\f195"}.fa-satellite:before{content:"\f7bf"}.fa-plane-lock:before{content:"\e558"}.fa-tag:before{content:"\f02b"}.fa-comment:before{content:"\f075"}.fa-birthday-cake:before,.fa-cake-candles:before,.fa-cake:before{content:"\f1fd"}.fa-envelope:before{content:"\f0e0"}.fa-angle-double-up:before,.fa-angles-up:before{content:"\f102"}.fa-paperclip:before{content:"\f0c6"}.fa-arrow-right-to-city:before{content:"\e4b3"}.fa-ribbon:before{content:"\f4d6"}.fa-lungs:before{content:"\f604"}.fa-arrow-up-9-1:before,.fa-sort-numeric-up-alt:before{content:"\f887"}.fa-litecoin-sign:before{content:"\e1d3"}.fa-border-none:before{content:"\f850"}.fa-circle-nodes:before{content:"\e4e2"}.fa-parachute-box:before{content:"\f4cd"}.fa-indent:before{content:"\f03c"}.fa-truck-field-un:before{content:"\e58e"}.fa-hourglass-empty:before,.fa-hourglass:before{content:"\f254"}.fa-mountain:before{content:"\f6fc"}.fa-user-doctor:before,.fa-user-md:before{content:"\f0f0"}.fa-circle-info:before,.fa-info-circle:before{content:"\f05a"}.fa-cloud-meatball:before{content:"\f73b"}.fa-camera-alt:before,.fa-camera:before{content:"\f030"}.fa-square-virus:before{content:"\e578"}.fa-meteor:before{content:"\f753"}.fa-car-on:before{content:"\e4dd"}.fa-sleigh:before{content:"\f7cc"}.fa-arrow-down-1-9:before,.fa-sort-numeric-asc:before,.fa-sort-numeric-down:before{content:"\f162"}.fa-hand-holding-droplet:before,.fa-hand-holding-water:before{content:"\f4c1"}.fa-water:before{content:"\f773"}.fa-calendar-check:before{content:"\f274"}.fa-braille:before{content:"\f2a1"}.fa-prescription-bottle-alt:before,.fa-prescription-bottle-medical:before{content:"\f486"}.fa-landmark:before{content:"\f66f"}.fa-truck:before{content:"\f0d1"}.fa-crosshairs:before{content:"\f05b"}.fa-person-cane:before{content:"\e53c"}.fa-tent:before{content:"\e57d"}.fa-vest-patches:before{content:"\e086"}.fa-check-double:before{content:"\f560"}.fa-arrow-down-a-z:before,.fa-sort-alpha-asc:before,.fa-sort-alpha-down:before{content:"\f15d"}.fa-money-bill-wheat:before{content:"\e52a"}.fa-cookie:before{content:"\f563"}.fa-arrow-left-rotate:before,.fa-arrow-rotate-back:before,.fa-arrow-rotate-backward:before,.fa-arrow-rotate-left:before,.fa-undo:before{content:"\f0e2"}.fa-hard-drive:before,.fa-hdd:before{content:"\f0a0"}.fa-face-grin-squint-tears:before,.fa-grin-squint-tears:before{content:"\f586"}.fa-dumbbell:before{content:"\f44b"}.fa-list-alt:before,.fa-rectangle-list:before{content:"\f022"}.fa-tarp-droplet:before{content:"\e57c"}.fa-house-medical-circle-check:before{content:"\e511"}.fa-person-skiing-nordic:before,.fa-skiing-nordic:before{content:"\f7ca"}.fa-calendar-plus:before{content:"\f271"}.fa-plane-arrival:before{content:"\f5af"}.fa-arrow-alt-circle-left:before,.fa-circle-left:before{content:"\f359"}.fa-subway:before,.fa-train-subway:before{content:"\f239"}.fa-chart-gantt:before{content:"\e0e4"}.fa-indian-rupee-sign:before,.fa-indian-rupee:before,.fa-inr:before{content:"\e1bc"}.fa-crop-alt:before,.fa-crop-simple:before{content:"\f565"}.fa-money-bill-1:before,.fa-money-bill-alt:before{content:"\f3d1"}.fa-left-long:before,.fa-long-arrow-alt-left:before{content:"\f30a"}.fa-dna:before{content:"\f471"}.fa-virus-slash:before{content:"\e075"}.fa-minus:before,.fa-subtract:before{content:"\f068"}.fa-chess:before{content:"\f439"}.fa-arrow-left-long:before,.fa-long-arrow-left:before{content:"\f177"}.fa-plug-circle-check:before{content:"\e55c"}.fa-street-view:before{content:"\f21d"}.fa-franc-sign:before{content:"\e18f"}.fa-volume-off:before{content:"\f026"}.fa-american-sign-language-interpreting:before,.fa-asl-interpreting:before,.fa-hands-american-sign-language-interpreting:before,.fa-hands-asl-interpreting:before{content:"\f2a3"}.fa-cog:before,.fa-gear:before{content:"\f013"}.fa-droplet-slash:before,.fa-tint-slash:before{content:"\f5c7"}.fa-mosque:before{content:"\f678"}.fa-mosquito:before{content:"\e52b"}.fa-star-of-david:before{content:"\f69a"}.fa-person-military-rifle:before{content:"\e54b"}.fa-cart-shopping:before,.fa-shopping-cart:before{content:"\f07a"}.fa-vials:before{content:"\f493"}.fa-plug-circle-plus:before{content:"\e55f"}.fa-place-of-worship:before{content:"\f67f"}.fa-grip-vertical:before{content:"\f58e"}.fa-arrow-turn-up:before,.fa-level-up:before{content:"\f148"}.fa-u:before{content:"\55"}.fa-square-root-alt:before,.fa-square-root-variable:before{content:"\f698"}.fa-clock-four:before,.fa-clock:before{content:"\f017"}.fa-backward-step:before,.fa-step-backward:before{content:"\f048"}.fa-pallet:before{content:"\f482"}.fa-faucet:before{content:"\e005"}.fa-baseball-bat-ball:before{content:"\f432"}.fa-s:before{content:"\53"}.fa-timeline:before{content:"\e29c"}.fa-keyboard:before{content:"\f11c"}.fa-caret-down:before{content:"\f0d7"}.fa-clinic-medical:before,.fa-house-chimney-medical:before{content:"\f7f2"}.fa-temperature-3:before,.fa-temperature-three-quarters:before,.fa-thermometer-3:before,.fa-thermometer-three-quarters:before{content:"\f2c8"}.fa-mobile-android-alt:before,.fa-mobile-screen:before{content:"\f3cf"}.fa-plane-up:before{content:"\e22d"}.fa-piggy-bank:before{content:"\f4d3"}.fa-battery-3:before,.fa-battery-half:before{content:"\f242"}.fa-mountain-city:before{content:"\e52e"}.fa-coins:before{content:"\f51e"}.fa-khanda:before{content:"\f66d"}.fa-sliders-h:before,.fa-sliders:before{content:"\f1de"}.fa-folder-tree:before{content:"\f802"}.fa-network-wired:before{content:"\f6ff"}.fa-map-pin:before{content:"\f276"}.fa-hamsa:before{content:"\f665"}.fa-cent-sign:before{content:"\e3f5"}.fa-flask:before{content:"\f0c3"}.fa-person-pregnant:before{content:"\e31e"}.fa-wand-sparkles:before{content:"\f72b"}.fa-ellipsis-v:before,.fa-ellipsis-vertical:before{content:"\f142"}.fa-ticket:before{content:"\f145"}.fa-power-off:before{content:"\f011"}.fa-long-arrow-alt-right:before,.fa-right-long:before{content:"\f30b"}.fa-flag-usa:before{content:"\f74d"}.fa-laptop-file:before{content:"\e51d"}.fa-teletype:before,.fa-tty:before{content:"\f1e4"}.fa-diagram-next:before{content:"\e476"}.fa-person-rifle:before{content:"\e54e"}.fa-house-medical-circle-exclamation:before{content:"\e512"}.fa-closed-captioning:before{content:"\f20a"}.fa-hiking:before,.fa-person-hiking:before{content:"\f6ec"}.fa-venus-double:before{content:"\f226"}.fa-images:before{content:"\f302"}.fa-calculator:before{content:"\f1ec"}.fa-people-pulling:before{content:"\e535"}.fa-n:before{content:"\4e"}.fa-cable-car:before,.fa-tram:before{content:"\f7da"}.fa-cloud-rain:before{content:"\f73d"}.fa-building-circle-xmark:before{content:"\e4d4"}.fa-ship:before{content:"\f21a"}.fa-arrows-down-to-line:before{content:"\e4b8"}.fa-download:before{content:"\f019"}.fa-face-grin:before,.fa-grin:before{content:"\f580"}.fa-backspace:before,.fa-delete-left:before{content:"\f55a"}.fa-eye-dropper-empty:before,.fa-eye-dropper:before,.fa-eyedropper:before{content:"\f1fb"}.fa-file-circle-check:before{content:"\e5a0"}.fa-forward:before{content:"\f04e"}.fa-mobile-android:before,.fa-mobile-phone:before,.fa-mobile:before{content:"\f3ce"}.fa-face-meh:before,.fa-meh:before{content:"\f11a"}.fa-align-center:before{content:"\f037"}.fa-book-dead:before,.fa-book-skull:before{content:"\f6b7"}.fa-drivers-license:before,.fa-id-card:before{content:"\f2c2"}.fa-dedent:before,.fa-outdent:before{content:"\f03b"}.fa-heart-circle-exclamation:before{content:"\e4fe"}.fa-home-alt:before,.fa-home-lg-alt:before,.fa-home:before,.fa-house:before{content:"\f015"}.fa-calendar-week:before{content:"\f784"}.fa-laptop-medical:before{content:"\f812"}.fa-b:before{content:"\42"}.fa-file-medical:before{content:"\f477"}.fa-dice-one:before{content:"\f525"}.fa-kiwi-bird:before{content:"\f535"}.fa-arrow-right-arrow-left:before,.fa-exchange:before{content:"\f0ec"}.fa-redo-alt:before,.fa-rotate-forward:before,.fa-rotate-right:before{content:"\f2f9"}.fa-cutlery:before,.fa-utensils:before{content:"\f2e7"}.fa-arrow-up-wide-short:before,.fa-sort-amount-up:before{content:"\f161"}.fa-mill-sign:before{content:"\e1ed"}.fa-bowl-rice:before{content:"\e2eb"}.fa-skull:before{content:"\f54c"}.fa-broadcast-tower:before,.fa-tower-broadcast:before{content:"\f519"}.fa-truck-pickup:before{content:"\f63c"}.fa-long-arrow-alt-up:before,.fa-up-long:before{content:"\f30c"}.fa-stop:before{content:"\f04d"}.fa-code-merge:before{content:"\f387"}.fa-upload:before{content:"\f093"}.fa-hurricane:before{content:"\f751"}.fa-mound:before{content:"\e52d"}.fa-toilet-portable:before{content:"\e583"}.fa-compact-disc:before{content:"\f51f"}.fa-file-arrow-down:before,.fa-file-download:before{content:"\f56d"}.fa-caravan:before{content:"\f8ff"}.fa-shield-cat:before{content:"\e572"}.fa-bolt:before,.fa-zap:before{content:"\f0e7"}.fa-glass-water:before{content:"\e4f4"}.fa-oil-well:before{content:"\e532"}.fa-vault:before{content:"\e2c5"}.fa-mars:before{content:"\f222"}.fa-toilet:before{content:"\f7d8"}.fa-plane-circle-xmark:before{content:"\e557"}.fa-cny:before,.fa-jpy:before,.fa-rmb:before,.fa-yen-sign:before,.fa-yen:before{content:"\f157"}.fa-rouble:before,.fa-rub:before,.fa-ruble-sign:before,.fa-ruble:before{content:"\f158"}.fa-sun:before{content:"\f185"}.fa-guitar:before{content:"\f7a6"}.fa-face-laugh-wink:before,.fa-laugh-wink:before{content:"\f59c"}.fa-horse-head:before{content:"\f7ab"}.fa-bore-hole:before{content:"\e4c3"}.fa-industry:before{content:"\f275"}.fa-arrow-alt-circle-down:before,.fa-circle-down:before{content:"\f358"}.fa-arrows-turn-to-dots:before{content:"\e4c1"}.fa-florin-sign:before{content:"\e184"}.fa-arrow-down-short-wide:before,.fa-sort-amount-desc:before,.fa-sort-amount-down-alt:before{content:"\f884"}.fa-less-than:before{content:"\3c"}.fa-angle-down:before{content:"\f107"}.fa-car-tunnel:before{content:"\e4de"}.fa-head-side-cough:before{content:"\e061"}.fa-grip-lines:before{content:"\f7a4"}.fa-thumbs-down:before{content:"\f165"}.fa-user-lock:before{content:"\f502"}.fa-arrow-right-long:before,.fa-long-arrow-right:before{content:"\f178"}.fa-anchor-circle-xmark:before{content:"\e4ac"}.fa-ellipsis-h:before,.fa-ellipsis:before{content:"\f141"}.fa-chess-pawn:before{content:"\f443"}.fa-first-aid:before,.fa-kit-medical:before{content:"\f479"}.fa-person-through-window:before{content:"\e5a9"}.fa-toolbox:before{content:"\f552"}.fa-hands-holding-circle:before{content:"\e4fb"}.fa-bug:before{content:"\f188"}.fa-credit-card-alt:before,.fa-credit-card:before{content:"\f09d"}.fa-automobile:before,.fa-car:before{content:"\f1b9"}.fa-hand-holding-hand:before{content:"\e4f7"}.fa-book-open-reader:before,.fa-book-reader:before{content:"\f5da"}.fa-mountain-sun:before{content:"\e52f"}.fa-arrows-left-right-to-line:before{content:"\e4ba"}.fa-dice-d20:before{content:"\f6cf"}.fa-truck-droplet:before{content:"\e58c"}.fa-file-circle-xmark:before{content:"\e5a1"}.fa-temperature-arrow-up:before,.fa-temperature-up:before{content:"\e040"}.fa-medal:before{content:"\f5a2"}.fa-bed:before{content:"\f236"}.fa-h-square:before,.fa-square-h:before{content:"\f0fd"}.fa-podcast:before{content:"\f2ce"}.fa-temperature-4:before,.fa-temperature-full:before,.fa-thermometer-4:before,.fa-thermometer-full:before{content:"\f2c7"}.fa-bell:before{content:"\f0f3"}.fa-superscript:before{content:"\f12b"}.fa-plug-circle-xmark:before{content:"\e560"}.fa-star-of-life:before{content:"\f621"}.fa-phone-slash:before{content:"\f3dd"}.fa-paint-roller:before{content:"\f5aa"}.fa-hands-helping:before,.fa-handshake-angle:before{content:"\f4c4"}.fa-location-dot:before,.fa-map-marker-alt:before{content:"\f3c5"}.fa-file:before{content:"\f15b"}.fa-greater-than:before{content:"\3e"}.fa-person-swimming:before,.fa-swimmer:before{content:"\f5c4"}.fa-arrow-down:before{content:"\f063"}.fa-droplet:before,.fa-tint:before{content:"\f043"}.fa-eraser:before{content:"\f12d"}.fa-earth-america:before,.fa-earth-americas:before,.fa-earth:before,.fa-globe-americas:before{content:"\f57d"}.fa-person-burst:before{content:"\e53b"}.fa-dove:before{content:"\f4ba"}.fa-battery-0:before,.fa-battery-empty:before{content:"\f244"}.fa-socks:before{content:"\f696"}.fa-inbox:before{content:"\f01c"}.fa-section:before{content:"\e447"}.fa-gauge-high:before,.fa-tachometer-alt-fast:before,.fa-tachometer-alt:before{content:"\f625"}.fa-envelope-open-text:before{content:"\f658"}.fa-hospital-alt:before,.fa-hospital-wide:before,.fa-hospital:before{content:"\f0f8"}.fa-wine-bottle:before{content:"\f72f"}.fa-chess-rook:before{content:"\f447"}.fa-bars-staggered:before,.fa-reorder:before,.fa-stream:before{content:"\f550"}.fa-dharmachakra:before{content:"\f655"}.fa-hotdog:before{content:"\f80f"}.fa-blind:before,.fa-person-walking-with-cane:before{content:"\f29d"}.fa-drum:before{content:"\f569"}.fa-ice-cream:before{content:"\f810"}.fa-heart-circle-bolt:before{content:"\e4fc"}.fa-fax:before{content:"\f1ac"}.fa-paragraph:before{content:"\f1dd"}.fa-check-to-slot:before,.fa-vote-yea:before{content:"\f772"}.fa-star-half:before{content:"\f089"}.fa-boxes-alt:before,.fa-boxes-stacked:before,.fa-boxes:before{content:"\f468"}.fa-chain:before,.fa-link:before{content:"\f0c1"}.fa-assistive-listening-systems:before,.fa-ear-listen:before{content:"\f2a2"}.fa-tree-city:before{content:"\e587"}.fa-play:before{content:"\f04b"}.fa-font:before{content:"\f031"}.fa-table-cells-row-lock:before{content:"\e67a"}.fa-rupiah-sign:before{content:"\e23d"}.fa-magnifying-glass:before,.fa-search:before{content:"\f002"}.fa-ping-pong-paddle-ball:before,.fa-table-tennis-paddle-ball:before,.fa-table-tennis:before{content:"\f45d"}.fa-diagnoses:before,.fa-person-dots-from-line:before{content:"\f470"}.fa-trash-can-arrow-up:before,.fa-trash-restore-alt:before{content:"\f82a"}.fa-naira-sign:before{content:"\e1f6"}.fa-cart-arrow-down:before{content:"\f218"}.fa-walkie-talkie:before{content:"\f8ef"}.fa-file-edit:before,.fa-file-pen:before{content:"\f31c"}.fa-receipt:before{content:"\f543"}.fa-pen-square:before,.fa-pencil-square:before,.fa-square-pen:before{content:"\f14b"}.fa-suitcase-rolling:before{content:"\f5c1"}.fa-person-circle-exclamation:before{content:"\e53f"}.fa-chevron-down:before{content:"\f078"}.fa-battery-5:before,.fa-battery-full:before,.fa-battery:before{content:"\f240"}.fa-skull-crossbones:before{content:"\f714"}.fa-code-compare:before{content:"\e13a"}.fa-list-dots:before,.fa-list-ul:before{content:"\f0ca"}.fa-school-lock:before{content:"\e56f"}.fa-tower-cell:before{content:"\e585"}.fa-down-long:before,.fa-long-arrow-alt-down:before{content:"\f309"}.fa-ranking-star:before{content:"\e561"}.fa-chess-king:before{content:"\f43f"}.fa-person-harassing:before{content:"\e549"}.fa-brazilian-real-sign:before{content:"\e46c"}.fa-landmark-alt:before,.fa-landmark-dome:before{content:"\f752"}.fa-arrow-up:before{content:"\f062"}.fa-television:before,.fa-tv-alt:before,.fa-tv:before{content:"\f26c"}.fa-shrimp:before{content:"\e448"}.fa-list-check:before,.fa-tasks:before{content:"\f0ae"}.fa-jug-detergent:before{content:"\e519"}.fa-circle-user:before,.fa-user-circle:before{content:"\f2bd"}.fa-user-shield:before{content:"\f505"}.fa-wind:before{content:"\f72e"}.fa-car-burst:before,.fa-car-crash:before{content:"\f5e1"}.fa-y:before{content:"\59"}.fa-person-snowboarding:before,.fa-snowboarding:before{content:"\f7ce"}.fa-shipping-fast:before,.fa-truck-fast:before{content:"\f48b"}.fa-fish:before{content:"\f578"}.fa-user-graduate:before{content:"\f501"}.fa-adjust:before,.fa-circle-half-stroke:before{content:"\f042"}.fa-clapperboard:before{content:"\e131"}.fa-circle-radiation:before,.fa-radiation-alt:before{content:"\f7ba"}.fa-baseball-ball:before,.fa-baseball:before{content:"\f433"}.fa-jet-fighter-up:before{content:"\e518"}.fa-diagram-project:before,.fa-project-diagram:before{content:"\f542"}.fa-copy:before{content:"\f0c5"}.fa-volume-mute:before,.fa-volume-times:before,.fa-volume-xmark:before{content:"\f6a9"}.fa-hand-sparkles:before{content:"\e05d"}.fa-grip-horizontal:before,.fa-grip:before{content:"\f58d"}.fa-share-from-square:before,.fa-share-square:before{content:"\f14d"}.fa-child-combatant:before,.fa-child-rifle:before{content:"\e4e0"}.fa-gun:before{content:"\e19b"}.fa-phone-square:before,.fa-square-phone:before{content:"\f098"}.fa-add:before,.fa-plus:before{content:"\2b"}.fa-expand:before{content:"\f065"}.fa-computer:before{content:"\e4e5"}.fa-close:before,.fa-multiply:before,.fa-remove:before,.fa-times:before,.fa-xmark:before{content:"\f00d"}.fa-arrows-up-down-left-right:before,.fa-arrows:before{content:"\f047"}.fa-chalkboard-teacher:before,.fa-chalkboard-user:before{content:"\f51c"}.fa-peso-sign:before{content:"\e222"}.fa-building-shield:before{content:"\e4d8"}.fa-baby:before{content:"\f77c"}.fa-users-line:before{content:"\e592"}.fa-quote-left-alt:before,.fa-quote-left:before{content:"\f10d"}.fa-tractor:before{content:"\f722"}.fa-trash-arrow-up:before,.fa-trash-restore:before{content:"\f829"}.fa-arrow-down-up-lock:before{content:"\e4b0"}.fa-lines-leaning:before{content:"\e51e"}.fa-ruler-combined:before{content:"\f546"}.fa-copyright:before{content:"\f1f9"}.fa-equals:before{content:"\3d"}.fa-blender:before{content:"\f517"}.fa-teeth:before{content:"\f62e"}.fa-ils:before,.fa-shekel-sign:before,.fa-shekel:before,.fa-sheqel-sign:before,.fa-sheqel:before{content:"\f20b"}.fa-map:before{content:"\f279"}.fa-rocket:before{content:"\f135"}.fa-photo-film:before,.fa-photo-video:before{content:"\f87c"}.fa-folder-minus:before{content:"\f65d"}.fa-store:before{content:"\f54e"}.fa-arrow-trend-up:before{content:"\e098"}.fa-plug-circle-minus:before{content:"\e55e"}.fa-sign-hanging:before,.fa-sign:before{content:"\f4d9"}.fa-bezier-curve:before{content:"\f55b"}.fa-bell-slash:before{content:"\f1f6"}.fa-tablet-android:before,.fa-tablet:before{content:"\f3fb"}.fa-school-flag:before{content:"\e56e"}.fa-fill:before{content:"\f575"}.fa-angle-up:before{content:"\f106"}.fa-drumstick-bite:before{content:"\f6d7"}.fa-holly-berry:before{content:"\f7aa"}.fa-chevron-left:before{content:"\f053"}.fa-bacteria:before{content:"\e059"}.fa-hand-lizard:before{content:"\f258"}.fa-notdef:before{content:"\e1fe"}.fa-disease:before{content:"\f7fa"}.fa-briefcase-medical:before{content:"\f469"}.fa-genderless:before{content:"\f22d"}.fa-chevron-right:before{content:"\f054"}.fa-retweet:before{content:"\f079"}.fa-car-alt:before,.fa-car-rear:before{content:"\f5de"}.fa-pump-soap:before{content:"\e06b"}.fa-video-slash:before{content:"\f4e2"}.fa-battery-2:before,.fa-battery-quarter:before{content:"\f243"}.fa-radio:before{content:"\f8d7"}.fa-baby-carriage:before,.fa-carriage-baby:before{content:"\f77d"}.fa-traffic-light:before{content:"\f637"}.fa-thermometer:before{content:"\f491"}.fa-vr-cardboard:before{content:"\f729"}.fa-hand-middle-finger:before{content:"\f806"}.fa-percent:before,.fa-percentage:before{content:"\25"}.fa-truck-moving:before{content:"\f4df"}.fa-glass-water-droplet:before{content:"\e4f5"}.fa-display:before{content:"\e163"}.fa-face-smile:before,.fa-smile:before{content:"\f118"}.fa-thumb-tack:before,.fa-thumbtack:before{content:"\f08d"}.fa-trophy:before{content:"\f091"}.fa-person-praying:before,.fa-pray:before{content:"\f683"}.fa-hammer:before{content:"\f6e3"}.fa-hand-peace:before{content:"\f25b"}.fa-rotate:before,.fa-sync-alt:before{content:"\f2f1"}.fa-spinner:before{content:"\f110"}.fa-robot:before{content:"\f544"}.fa-peace:before{content:"\f67c"}.fa-cogs:before,.fa-gears:before{content:"\f085"}.fa-warehouse:before{content:"\f494"}.fa-arrow-up-right-dots:before{content:"\e4b7"}.fa-splotch:before{content:"\f5bc"}.fa-face-grin-hearts:before,.fa-grin-hearts:before{content:"\f584"}.fa-dice-four:before{content:"\f524"}.fa-sim-card:before{content:"\f7c4"}.fa-transgender-alt:before,.fa-transgender:before{content:"\f225"}.fa-mercury:before{content:"\f223"}.fa-arrow-turn-down:before,.fa-level-down:before{content:"\f149"}.fa-person-falling-burst:before{content:"\e547"}.fa-award:before{content:"\f559"}.fa-ticket-alt:before,.fa-ticket-simple:before{content:"\f3ff"}.fa-building:before{content:"\f1ad"}.fa-angle-double-left:before,.fa-angles-left:before{content:"\f100"}.fa-qrcode:before{content:"\f029"}.fa-clock-rotate-left:before,.fa-history:before{content:"\f1da"}.fa-face-grin-beam-sweat:before,.fa-grin-beam-sweat:before{content:"\f583"}.fa-arrow-right-from-file:before,.fa-file-export:before{content:"\f56e"}.fa-shield-blank:before,.fa-shield:before{content:"\f132"}.fa-arrow-up-short-wide:before,.fa-sort-amount-up-alt:before{content:"\f885"}.fa-house-medical:before{content:"\e3b2"}.fa-golf-ball-tee:before,.fa-golf-ball:before{content:"\f450"}.fa-chevron-circle-left:before,.fa-circle-chevron-left:before{content:"\f137"}.fa-house-chimney-window:before{content:"\e00d"}.fa-pen-nib:before{content:"\f5ad"}.fa-tent-arrow-turn-left:before{content:"\e580"}.fa-tents:before{content:"\e582"}.fa-magic:before,.fa-wand-magic:before{content:"\f0d0"}.fa-dog:before{content:"\f6d3"}.fa-carrot:before{content:"\f787"}.fa-moon:before{content:"\f186"}.fa-wine-glass-alt:before,.fa-wine-glass-empty:before{content:"\f5ce"}.fa-cheese:before{content:"\f7ef"}.fa-yin-yang:before{content:"\f6ad"}.fa-music:before{content:"\f001"}.fa-code-commit:before{content:"\f386"}.fa-temperature-low:before{content:"\f76b"}.fa-biking:before,.fa-person-biking:before{content:"\f84a"}.fa-broom:before{content:"\f51a"}.fa-shield-heart:before{content:"\e574"}.fa-gopuram:before{content:"\f664"}.fa-earth-oceania:before,.fa-globe-oceania:before{content:"\e47b"}.fa-square-xmark:before,.fa-times-square:before,.fa-xmark-square:before{content:"\f2d3"}.fa-hashtag:before{content:"\23"}.fa-expand-alt:before,.fa-up-right-and-down-left-from-center:before{content:"\f424"}.fa-oil-can:before{content:"\f613"}.fa-t:before{content:"\54"}.fa-hippo:before{content:"\f6ed"}.fa-chart-column:before{content:"\e0e3"}.fa-infinity:before{content:"\f534"}.fa-vial-circle-check:before{content:"\e596"}.fa-person-arrow-down-to-line:before{content:"\e538"}.fa-voicemail:before{content:"\f897"}.fa-fan:before{content:"\f863"}.fa-person-walking-luggage:before{content:"\e554"}.fa-arrows-alt-v:before,.fa-up-down:before{content:"\f338"}.fa-cloud-moon-rain:before{content:"\f73c"}.fa-calendar:before{content:"\f133"}.fa-trailer:before{content:"\e041"}.fa-bahai:before,.fa-haykal:before{content:"\f666"}.fa-sd-card:before{content:"\f7c2"}.fa-dragon:before{content:"\f6d5"}.fa-shoe-prints:before{content:"\f54b"}.fa-circle-plus:before,.fa-plus-circle:before{content:"\f055"}.fa-face-grin-tongue-wink:before,.fa-grin-tongue-wink:before{content:"\f58b"}.fa-hand-holding:before{content:"\f4bd"}.fa-plug-circle-exclamation:before{content:"\e55d"}.fa-chain-broken:before,.fa-chain-slash:before,.fa-link-slash:before,.fa-unlink:before{content:"\f127"}.fa-clone:before{content:"\f24d"}.fa-person-walking-arrow-loop-left:before{content:"\e551"}.fa-arrow-up-z-a:before,.fa-sort-alpha-up-alt:before{content:"\f882"}.fa-fire-alt:before,.fa-fire-flame-curved:before{content:"\f7e4"}.fa-tornado:before{content:"\f76f"}.fa-file-circle-plus:before{content:"\e494"}.fa-book-quran:before,.fa-quran:before{content:"\f687"}.fa-anchor:before{content:"\f13d"}.fa-border-all:before{content:"\f84c"}.fa-angry:before,.fa-face-angry:before{content:"\f556"}.fa-cookie-bite:before{content:"\f564"}.fa-arrow-trend-down:before{content:"\e097"}.fa-feed:before,.fa-rss:before{content:"\f09e"}.fa-draw-polygon:before{content:"\f5ee"}.fa-balance-scale:before,.fa-scale-balanced:before{content:"\f24e"}.fa-gauge-simple-high:before,.fa-tachometer-fast:before,.fa-tachometer:before{content:"\f62a"}.fa-shower:before{content:"\f2cc"}.fa-desktop-alt:before,.fa-desktop:before{content:"\f390"}.fa-m:before{content:"\4d"}.fa-table-list:before,.fa-th-list:before{content:"\f00b"}.fa-comment-sms:before,.fa-sms:before{content:"\f7cd"}.fa-book:before{content:"\f02d"}.fa-user-plus:before{content:"\f234"}.fa-check:before{content:"\f00c"}.fa-battery-4:before,.fa-battery-three-quarters:before{content:"\f241"}.fa-house-circle-check:before{content:"\e509"}.fa-angle-left:before{content:"\f104"}.fa-diagram-successor:before{content:"\e47a"}.fa-truck-arrow-right:before{content:"\e58b"}.fa-arrows-split-up-and-left:before{content:"\e4bc"}.fa-fist-raised:before,.fa-hand-fist:before{content:"\f6de"}.fa-cloud-moon:before{content:"\f6c3"}.fa-briefcase:before{content:"\f0b1"}.fa-person-falling:before{content:"\e546"}.fa-image-portrait:before,.fa-portrait:before{content:"\f3e0"}.fa-user-tag:before{content:"\f507"}.fa-rug:before{content:"\e569"}.fa-earth-europe:before,.fa-globe-europe:before{content:"\f7a2"}.fa-cart-flatbed-suitcase:before,.fa-luggage-cart:before{content:"\f59d"}.fa-rectangle-times:before,.fa-rectangle-xmark:before,.fa-times-rectangle:before,.fa-window-close:before{content:"\f410"}.fa-baht-sign:before{content:"\e0ac"}.fa-book-open:before{content:"\f518"}.fa-book-journal-whills:before,.fa-journal-whills:before{content:"\f66a"}.fa-handcuffs:before{content:"\e4f8"}.fa-exclamation-triangle:before,.fa-triangle-exclamation:before,.fa-warning:before{content:"\f071"}.fa-database:before{content:"\f1c0"}.fa-mail-forward:before,.fa-share:before{content:"\f064"}.fa-bottle-droplet:before{content:"\e4c4"}.fa-mask-face:before{content:"\e1d7"}.fa-hill-rockslide:before{content:"\e508"}.fa-exchange-alt:before,.fa-right-left:before{content:"\f362"}.fa-paper-plane:before{content:"\f1d8"}.fa-road-circle-exclamation:before{content:"\e565"}.fa-dungeon:before{content:"\f6d9"}.fa-align-right:before{content:"\f038"}.fa-money-bill-1-wave:before,.fa-money-bill-wave-alt:before{content:"\f53b"}.fa-life-ring:before{content:"\f1cd"}.fa-hands:before,.fa-sign-language:before,.fa-signing:before{content:"\f2a7"}.fa-calendar-day:before{content:"\f783"}.fa-ladder-water:before,.fa-swimming-pool:before,.fa-water-ladder:before{content:"\f5c5"}.fa-arrows-up-down:before,.fa-arrows-v:before{content:"\f07d"}.fa-face-grimace:before,.fa-grimace:before{content:"\f57f"}.fa-wheelchair-alt:before,.fa-wheelchair-move:before{content:"\e2ce"}.fa-level-down-alt:before,.fa-turn-down:before{content:"\f3be"}.fa-person-walking-arrow-right:before{content:"\e552"}.fa-envelope-square:before,.fa-square-envelope:before{content:"\f199"}.fa-dice:before{content:"\f522"}.fa-bowling-ball:before{content:"\f436"}.fa-brain:before{content:"\f5dc"}.fa-band-aid:before,.fa-bandage:before{content:"\f462"}.fa-calendar-minus:before{content:"\f272"}.fa-circle-xmark:before,.fa-times-circle:before,.fa-xmark-circle:before{content:"\f057"}.fa-gifts:before{content:"\f79c"}.fa-hotel:before{content:"\f594"}.fa-earth-asia:before,.fa-globe-asia:before{content:"\f57e"}.fa-id-card-alt:before,.fa-id-card-clip:before{content:"\f47f"}.fa-magnifying-glass-plus:before,.fa-search-plus:before{content:"\f00e"}.fa-thumbs-up:before{content:"\f164"}.fa-user-clock:before{content:"\f4fd"}.fa-allergies:before,.fa-hand-dots:before{content:"\f461"}.fa-file-invoice:before{content:"\f570"}.fa-window-minimize:before{content:"\f2d1"}.fa-coffee:before,.fa-mug-saucer:before{content:"\f0f4"}.fa-brush:before{content:"\f55d"}.fa-mask:before{content:"\f6fa"}.fa-magnifying-glass-minus:before,.fa-search-minus:before{content:"\f010"}.fa-ruler-vertical:before{content:"\f548"}.fa-user-alt:before,.fa-user-large:before{content:"\f406"}.fa-train-tram:before{content:"\e5b4"}.fa-user-nurse:before{content:"\f82f"}.fa-syringe:before{content:"\f48e"}.fa-cloud-sun:before{content:"\f6c4"}.fa-stopwatch-20:before{content:"\e06f"}.fa-square-full:before{content:"\f45c"}.fa-magnet:before{content:"\f076"}.fa-jar:before{content:"\e516"}.fa-note-sticky:before,.fa-sticky-note:before{content:"\f249"}.fa-bug-slash:before{content:"\e490"}.fa-arrow-up-from-water-pump:before{content:"\e4b6"}.fa-bone:before{content:"\f5d7"}.fa-user-injured:before{content:"\f728"}.fa-face-sad-tear:before,.fa-sad-tear:before{content:"\f5b4"}.fa-plane:before{content:"\f072"}.fa-tent-arrows-down:before{content:"\e581"}.fa-exclamation:before{content:"\21"}.fa-arrows-spin:before{content:"\e4bb"}.fa-print:before{content:"\f02f"}.fa-try:before,.fa-turkish-lira-sign:before,.fa-turkish-lira:before{content:"\e2bb"}.fa-dollar-sign:before,.fa-dollar:before,.fa-usd:before{content:"\24"}.fa-x:before{content:"\58"}.fa-magnifying-glass-dollar:before,.fa-search-dollar:before{content:"\f688"}.fa-users-cog:before,.fa-users-gear:before{content:"\f509"}.fa-person-military-pointing:before{content:"\e54a"}.fa-bank:before,.fa-building-columns:before,.fa-institution:before,.fa-museum:before,.fa-university:before{content:"\f19c"}.fa-umbrella:before{content:"\f0e9"}.fa-trowel:before{content:"\e589"}.fa-d:before{content:"\44"}.fa-stapler:before{content:"\e5af"}.fa-masks-theater:before,.fa-theater-masks:before{content:"\f630"}.fa-kip-sign:before{content:"\e1c4"}.fa-hand-point-left:before{content:"\f0a5"}.fa-handshake-alt:before,.fa-handshake-simple:before{content:"\f4c6"}.fa-fighter-jet:before,.fa-jet-fighter:before{content:"\f0fb"}.fa-share-alt-square:before,.fa-square-share-nodes:before{content:"\f1e1"}.fa-barcode:before{content:"\f02a"}.fa-plus-minus:before{content:"\e43c"}.fa-video-camera:before,.fa-video:before{content:"\f03d"}.fa-graduation-cap:before,.fa-mortar-board:before{content:"\f19d"}.fa-hand-holding-medical:before{content:"\e05c"}.fa-person-circle-check:before{content:"\e53e"}.fa-level-up-alt:before,.fa-turn-up:before{content:"\f3bf"} .fa-sr-only,.fa-sr-only-focusable:not(:focus),.sr-only,.sr-only-focusable:not(:focus){position:absolute;width:1px;height:1px;padding:0;margin:-1px;overflow:hidden;clip:rect(0,0,0,0);white-space:nowrap;border-width:0}:host,:root{--fa-style-family-brands:"Font Awesome 6 Brands";--fa-font-brands:normal 400 1em/1 "Font Awesome 6 Brands"}@font-face{font-family:"Font Awesome 6 Brands";font-style:normal;font-weight:400;font-display:block;src: url("../webfonts/fa-brands-400.woff2") format("woff2"), url("../webfonts/fa-brands-400.ttf") format("truetype"); }.fa-brands,.fab{font-weight:400}.fa-monero:before{content:"\f3d0"}.fa-hooli:before{content:"\f427"}.fa-yelp:before{content:"\f1e9"}.fa-cc-visa:before{content:"\f1f0"}.fa-lastfm:before{content:"\f202"}.fa-shopware:before{content:"\f5b5"}.fa-creative-commons-nc:before{content:"\f4e8"}.fa-aws:before{content:"\f375"}.fa-redhat:before{content:"\f7bc"}.fa-yoast:before{content:"\f2b1"}.fa-cloudflare:before{content:"\e07d"}.fa-ups:before{content:"\f7e0"}.fa-pixiv:before{content:"\e640"}.fa-wpexplorer:before{content:"\f2de"}.fa-dyalog:before{content:"\f399"}.fa-bity:before{content:"\f37a"}.fa-stackpath:before{content:"\f842"}.fa-buysellads:before{content:"\f20d"}.fa-first-order:before{content:"\f2b0"}.fa-modx:before{content:"\f285"}.fa-guilded:before{content:"\e07e"}.fa-vnv:before{content:"\f40b"}.fa-js-square:before,.fa-square-js:before{content:"\f3b9"}.fa-microsoft:before{content:"\f3ca"}.fa-qq:before{content:"\f1d6"}.fa-orcid:before{content:"\f8d2"}.fa-java:before{content:"\f4e4"}.fa-invision:before{content:"\f7b0"}.fa-creative-commons-pd-alt:before{content:"\f4ed"}.fa-centercode:before{content:"\f380"}.fa-glide-g:before{content:"\f2a6"}.fa-drupal:before{content:"\f1a9"}.fa-jxl:before{content:"\e67b"}.fa-hire-a-helper:before{content:"\f3b0"}.fa-creative-commons-by:before{content:"\f4e7"}.fa-unity:before{content:"\e049"}.fa-whmcs:before{content:"\f40d"}.fa-rocketchat:before{content:"\f3e8"}.fa-vk:before{content:"\f189"}.fa-untappd:before{content:"\f405"}.fa-mailchimp:before{content:"\f59e"}.fa-css3-alt:before{content:"\f38b"}.fa-reddit-square:before,.fa-square-reddit:before{content:"\f1a2"}.fa-vimeo-v:before{content:"\f27d"}.fa-contao:before{content:"\f26d"}.fa-square-font-awesome:before{content:"\e5ad"}.fa-deskpro:before{content:"\f38f"}.fa-brave:before{content:"\e63c"}.fa-sistrix:before{content:"\f3ee"}.fa-instagram-square:before,.fa-square-instagram:before{content:"\e055"}.fa-battle-net:before{content:"\f835"}.fa-the-red-yeti:before{content:"\f69d"}.fa-hacker-news-square:before,.fa-square-hacker-news:before{content:"\f3af"}.fa-edge:before{content:"\f282"}.fa-threads:before{content:"\e618"}.fa-napster:before{content:"\f3d2"}.fa-snapchat-square:before,.fa-square-snapchat:before{content:"\f2ad"}.fa-google-plus-g:before{content:"\f0d5"}.fa-artstation:before{content:"\f77a"}.fa-markdown:before{content:"\f60f"}.fa-sourcetree:before{content:"\f7d3"}.fa-google-plus:before{content:"\f2b3"}.fa-diaspora:before{content:"\f791"}.fa-foursquare:before{content:"\f180"}.fa-stack-overflow:before{content:"\f16c"}.fa-github-alt:before{content:"\f113"}.fa-phoenix-squadron:before{content:"\f511"}.fa-pagelines:before{content:"\f18c"}.fa-algolia:before{content:"\f36c"}.fa-red-river:before{content:"\f3e3"}.fa-creative-commons-sa:before{content:"\f4ef"}.fa-safari:before{content:"\f267"}.fa-google:before{content:"\f1a0"}.fa-font-awesome-alt:before,.fa-square-font-awesome-stroke:before{content:"\f35c"}.fa-atlassian:before{content:"\f77b"}.fa-linkedin-in:before{content:"\f0e1"}.fa-digital-ocean:before{content:"\f391"}.fa-nimblr:before{content:"\f5a8"}.fa-chromecast:before{content:"\f838"}.fa-evernote:before{content:"\f839"}.fa-hacker-news:before{content:"\f1d4"}.fa-creative-commons-sampling:before{content:"\f4f0"}.fa-adversal:before{content:"\f36a"}.fa-creative-commons:before{content:"\f25e"}.fa-watchman-monitoring:before{content:"\e087"}.fa-fonticons:before{content:"\f280"}.fa-weixin:before{content:"\f1d7"}.fa-shirtsinbulk:before{content:"\f214"}.fa-codepen:before{content:"\f1cb"}.fa-git-alt:before{content:"\f841"}.fa-lyft:before{content:"\f3c3"}.fa-rev:before{content:"\f5b2"}.fa-windows:before{content:"\f17a"}.fa-wizards-of-the-coast:before{content:"\f730"}.fa-square-viadeo:before,.fa-viadeo-square:before{content:"\f2aa"}.fa-meetup:before{content:"\f2e0"}.fa-centos:before{content:"\f789"}.fa-adn:before{content:"\f170"}.fa-cloudsmith:before{content:"\f384"}.fa-opensuse:before{content:"\e62b"}.fa-pied-piper-alt:before{content:"\f1a8"}.fa-dribbble-square:before,.fa-square-dribbble:before{content:"\f397"}.fa-codiepie:before{content:"\f284"}.fa-node:before{content:"\f419"}.fa-mix:before{content:"\f3cb"}.fa-steam:before{content:"\f1b6"}.fa-cc-apple-pay:before{content:"\f416"}.fa-scribd:before{content:"\f28a"}.fa-debian:before{content:"\e60b"}.fa-openid:before{content:"\f19b"}.fa-instalod:before{content:"\e081"}.fa-expeditedssl:before{content:"\f23e"}.fa-sellcast:before{content:"\f2da"}.fa-square-twitter:before,.fa-twitter-square:before{content:"\f081"}.fa-r-project:before{content:"\f4f7"}.fa-delicious:before{content:"\f1a5"}.fa-freebsd:before{content:"\f3a4"}.fa-vuejs:before{content:"\f41f"}.fa-accusoft:before{content:"\f369"}.fa-ioxhost:before{content:"\f208"}.fa-fonticons-fi:before{content:"\f3a2"}.fa-app-store:before{content:"\f36f"}.fa-cc-mastercard:before{content:"\f1f1"}.fa-itunes-note:before{content:"\f3b5"}.fa-golang:before{content:"\e40f"}.fa-kickstarter:before,.fa-square-kickstarter:before{content:"\f3bb"}.fa-grav:before{content:"\f2d6"}.fa-weibo:before{content:"\f18a"}.fa-uncharted:before{content:"\e084"}.fa-firstdraft:before{content:"\f3a1"}.fa-square-youtube:before,.fa-youtube-square:before{content:"\f431"}.fa-wikipedia-w:before{content:"\f266"}.fa-rendact:before,.fa-wpressr:before{content:"\f3e4"}.fa-angellist:before{content:"\f209"}.fa-galactic-republic:before{content:"\f50c"}.fa-nfc-directional:before{content:"\e530"}.fa-skype:before{content:"\f17e"}.fa-joget:before{content:"\f3b7"}.fa-fedora:before{content:"\f798"}.fa-stripe-s:before{content:"\f42a"}.fa-meta:before{content:"\e49b"}.fa-laravel:before{content:"\f3bd"}.fa-hotjar:before{content:"\f3b1"}.fa-bluetooth-b:before{content:"\f294"}.fa-square-letterboxd:before{content:"\e62e"}.fa-sticker-mule:before{content:"\f3f7"}.fa-creative-commons-zero:before{content:"\f4f3"}.fa-hips:before{content:"\f452"}.fa-behance:before{content:"\f1b4"}.fa-reddit:before{content:"\f1a1"}.fa-discord:before{content:"\f392"}.fa-chrome:before{content:"\f268"}.fa-app-store-ios:before{content:"\f370"}.fa-cc-discover:before{content:"\f1f2"}.fa-wpbeginner:before{content:"\f297"}.fa-confluence:before{content:"\f78d"}.fa-shoelace:before{content:"\e60c"}.fa-mdb:before{content:"\f8ca"}.fa-dochub:before{content:"\f394"}.fa-accessible-icon:before{content:"\f368"}.fa-ebay:before{content:"\f4f4"}.fa-amazon:before{content:"\f270"}.fa-unsplash:before{content:"\e07c"}.fa-yarn:before{content:"\f7e3"}.fa-square-steam:before,.fa-steam-square:before{content:"\f1b7"}.fa-500px:before{content:"\f26e"}.fa-square-vimeo:before,.fa-vimeo-square:before{content:"\f194"}.fa-asymmetrik:before{content:"\f372"}.fa-font-awesome-flag:before,.fa-font-awesome-logo-full:before,.fa-font-awesome:before{content:"\f2b4"}.fa-gratipay:before{content:"\f184"}.fa-apple:before{content:"\f179"}.fa-hive:before{content:"\e07f"}.fa-gitkraken:before{content:"\f3a6"}.fa-keybase:before{content:"\f4f5"}.fa-apple-pay:before{content:"\f415"}.fa-padlet:before{content:"\e4a0"}.fa-amazon-pay:before{content:"\f42c"}.fa-github-square:before,.fa-square-github:before{content:"\f092"}.fa-stumbleupon:before{content:"\f1a4"}.fa-fedex:before{content:"\f797"}.fa-phoenix-framework:before{content:"\f3dc"}.fa-shopify:before{content:"\e057"}.fa-neos:before{content:"\f612"}.fa-square-threads:before{content:"\e619"}.fa-hackerrank:before{content:"\f5f7"}.fa-researchgate:before{content:"\f4f8"}.fa-swift:before{content:"\f8e1"}.fa-angular:before{content:"\f420"}.fa-speakap:before{content:"\f3f3"}.fa-angrycreative:before{content:"\f36e"}.fa-y-combinator:before{content:"\f23b"}.fa-empire:before{content:"\f1d1"}.fa-envira:before{content:"\f299"}.fa-google-scholar:before{content:"\e63b"}.fa-gitlab-square:before,.fa-square-gitlab:before{content:"\e5ae"}.fa-studiovinari:before{content:"\f3f8"}.fa-pied-piper:before{content:"\f2ae"}.fa-wordpress:before{content:"\f19a"}.fa-product-hunt:before{content:"\f288"}.fa-firefox:before{content:"\f269"}.fa-linode:before{content:"\f2b8"}.fa-goodreads:before{content:"\f3a8"}.fa-odnoklassniki-square:before,.fa-square-odnoklassniki:before{content:"\f264"}.fa-jsfiddle:before{content:"\f1cc"}.fa-sith:before{content:"\f512"}.fa-themeisle:before{content:"\f2b2"}.fa-page4:before{content:"\f3d7"}.fa-hashnode:before{content:"\e499"}.fa-react:before{content:"\f41b"}.fa-cc-paypal:before{content:"\f1f4"}.fa-squarespace:before{content:"\f5be"}.fa-cc-stripe:before{content:"\f1f5"}.fa-creative-commons-share:before{content:"\f4f2"}.fa-bitcoin:before{content:"\f379"}.fa-keycdn:before{content:"\f3ba"}.fa-opera:before{content:"\f26a"}.fa-itch-io:before{content:"\f83a"}.fa-umbraco:before{content:"\f8e8"}.fa-galactic-senate:before{content:"\f50d"}.fa-ubuntu:before{content:"\f7df"}.fa-draft2digital:before{content:"\f396"}.fa-stripe:before{content:"\f429"}.fa-houzz:before{content:"\f27c"}.fa-gg:before{content:"\f260"}.fa-dhl:before{content:"\f790"}.fa-pinterest-square:before,.fa-square-pinterest:before{content:"\f0d3"}.fa-xing:before{content:"\f168"}.fa-blackberry:before{content:"\f37b"}.fa-creative-commons-pd:before{content:"\f4ec"}.fa-playstation:before{content:"\f3df"}.fa-quinscape:before{content:"\f459"}.fa-less:before{content:"\f41d"}.fa-blogger-b:before{content:"\f37d"}.fa-opencart:before{content:"\f23d"}.fa-vine:before{content:"\f1ca"}.fa-signal-messenger:before{content:"\e663"}.fa-paypal:before{content:"\f1ed"}.fa-gitlab:before{content:"\f296"}.fa-typo3:before{content:"\f42b"}.fa-reddit-alien:before{content:"\f281"}.fa-yahoo:before{content:"\f19e"}.fa-dailymotion:before{content:"\e052"}.fa-affiliatetheme:before{content:"\f36b"}.fa-pied-piper-pp:before{content:"\f1a7"}.fa-bootstrap:before{content:"\f836"}.fa-odnoklassniki:before{content:"\f263"}.fa-nfc-symbol:before{content:"\e531"}.fa-mintbit:before{content:"\e62f"}.fa-ethereum:before{content:"\f42e"}.fa-speaker-deck:before{content:"\f83c"}.fa-creative-commons-nc-eu:before{content:"\f4e9"}.fa-patreon:before{content:"\f3d9"}.fa-avianex:before{content:"\f374"}.fa-ello:before{content:"\f5f1"}.fa-gofore:before{content:"\f3a7"}.fa-bimobject:before{content:"\f378"}.fa-brave-reverse:before{content:"\e63d"}.fa-facebook-f:before{content:"\f39e"}.fa-google-plus-square:before,.fa-square-google-plus:before{content:"\f0d4"}.fa-web-awesome:before{content:"\e682"}.fa-mandalorian:before{content:"\f50f"}.fa-first-order-alt:before{content:"\f50a"}.fa-osi:before{content:"\f41a"}.fa-google-wallet:before{content:"\f1ee"}.fa-d-and-d-beyond:before{content:"\f6ca"}.fa-periscope:before{content:"\f3da"}.fa-fulcrum:before{content:"\f50b"}.fa-cloudscale:before{content:"\f383"}.fa-forumbee:before{content:"\f211"}.fa-mizuni:before{content:"\f3cc"}.fa-schlix:before{content:"\f3ea"}.fa-square-xing:before,.fa-xing-square:before{content:"\f169"}.fa-bandcamp:before{content:"\f2d5"}.fa-wpforms:before{content:"\f298"}.fa-cloudversify:before{content:"\f385"}.fa-usps:before{content:"\f7e1"}.fa-megaport:before{content:"\f5a3"}.fa-magento:before{content:"\f3c4"}.fa-spotify:before{content:"\f1bc"}.fa-optin-monster:before{content:"\f23c"}.fa-fly:before{content:"\f417"}.fa-aviato:before{content:"\f421"}.fa-itunes:before{content:"\f3b4"}.fa-cuttlefish:before{content:"\f38c"}.fa-blogger:before{content:"\f37c"}.fa-flickr:before{content:"\f16e"}.fa-viber:before{content:"\f409"}.fa-soundcloud:before{content:"\f1be"}.fa-digg:before{content:"\f1a6"}.fa-tencent-weibo:before{content:"\f1d5"}.fa-letterboxd:before{content:"\e62d"}.fa-symfony:before{content:"\f83d"}.fa-maxcdn:before{content:"\f136"}.fa-etsy:before{content:"\f2d7"}.fa-facebook-messenger:before{content:"\f39f"}.fa-audible:before{content:"\f373"}.fa-think-peaks:before{content:"\f731"}.fa-bilibili:before{content:"\e3d9"}.fa-erlang:before{content:"\f39d"}.fa-x-twitter:before{content:"\e61b"}.fa-cotton-bureau:before{content:"\f89e"}.fa-dashcube:before{content:"\f210"}.fa-42-group:before,.fa-innosoft:before{content:"\e080"}.fa-stack-exchange:before{content:"\f18d"}.fa-elementor:before{content:"\f430"}.fa-pied-piper-square:before,.fa-square-pied-piper:before{content:"\e01e"}.fa-creative-commons-nd:before{content:"\f4eb"}.fa-palfed:before{content:"\f3d8"}.fa-superpowers:before{content:"\f2dd"}.fa-resolving:before{content:"\f3e7"}.fa-xbox:before{content:"\f412"}.fa-square-web-awesome-stroke:before{content:"\e684"}.fa-searchengin:before{content:"\f3eb"}.fa-tiktok:before{content:"\e07b"}.fa-facebook-square:before,.fa-square-facebook:before{content:"\f082"}.fa-renren:before{content:"\f18b"}.fa-linux:before{content:"\f17c"}.fa-glide:before{content:"\f2a5"}.fa-linkedin:before{content:"\f08c"}.fa-hubspot:before{content:"\f3b2"}.fa-deploydog:before{content:"\f38e"}.fa-twitch:before{content:"\f1e8"}.fa-ravelry:before{content:"\f2d9"}.fa-mixer:before{content:"\e056"}.fa-lastfm-square:before,.fa-square-lastfm:before{content:"\f203"}.fa-vimeo:before{content:"\f40a"}.fa-mendeley:before{content:"\f7b3"}.fa-uniregistry:before{content:"\f404"}.fa-figma:before{content:"\f799"}.fa-creative-commons-remix:before{content:"\f4ee"}.fa-cc-amazon-pay:before{content:"\f42d"}.fa-dropbox:before{content:"\f16b"}.fa-instagram:before{content:"\f16d"}.fa-cmplid:before{content:"\e360"}.fa-upwork:before{content:"\e641"}.fa-facebook:before{content:"\f09a"}.fa-gripfire:before{content:"\f3ac"}.fa-jedi-order:before{content:"\f50e"}.fa-uikit:before{content:"\f403"}.fa-fort-awesome-alt:before{content:"\f3a3"}.fa-phabricator:before{content:"\f3db"}.fa-ussunnah:before{content:"\f407"}.fa-earlybirds:before{content:"\f39a"}.fa-trade-federation:before{content:"\f513"}.fa-autoprefixer:before{content:"\f41c"}.fa-whatsapp:before{content:"\f232"}.fa-square-upwork:before{content:"\e67c"}.fa-slideshare:before{content:"\f1e7"}.fa-google-play:before{content:"\f3ab"}.fa-viadeo:before{content:"\f2a9"}.fa-line:before{content:"\f3c0"}.fa-google-drive:before{content:"\f3aa"}.fa-servicestack:before{content:"\f3ec"}.fa-simplybuilt:before{content:"\f215"}.fa-bitbucket:before{content:"\f171"}.fa-imdb:before{content:"\f2d8"}.fa-deezer:before{content:"\e077"}.fa-raspberry-pi:before{content:"\f7bb"}.fa-jira:before{content:"\f7b1"}.fa-docker:before{content:"\f395"}.fa-screenpal:before{content:"\e570"}.fa-bluetooth:before{content:"\f293"}.fa-gitter:before{content:"\f426"}.fa-d-and-d:before{content:"\f38d"}.fa-microblog:before{content:"\e01a"}.fa-cc-diners-club:before{content:"\f24c"}.fa-gg-circle:before{content:"\f261"}.fa-pied-piper-hat:before{content:"\f4e5"}.fa-kickstarter-k:before{content:"\f3bc"}.fa-yandex:before{content:"\f413"}.fa-readme:before{content:"\f4d5"}.fa-html5:before{content:"\f13b"}.fa-sellsy:before{content:"\f213"}.fa-square-web-awesome:before{content:"\e683"}.fa-sass:before{content:"\f41e"}.fa-wirsindhandwerk:before,.fa-wsh:before{content:"\e2d0"}.fa-buromobelexperte:before{content:"\f37f"}.fa-salesforce:before{content:"\f83b"}.fa-octopus-deploy:before{content:"\e082"}.fa-medapps:before{content:"\f3c6"}.fa-ns8:before{content:"\f3d5"}.fa-pinterest-p:before{content:"\f231"}.fa-apper:before{content:"\f371"}.fa-fort-awesome:before{content:"\f286"}.fa-waze:before{content:"\f83f"}.fa-bluesky:before{content:"\e671"}.fa-cc-jcb:before{content:"\f24b"}.fa-snapchat-ghost:before,.fa-snapchat:before{content:"\f2ab"}.fa-fantasy-flight-games:before{content:"\f6dc"}.fa-rust:before{content:"\e07a"}.fa-wix:before{content:"\f5cf"}.fa-behance-square:before,.fa-square-behance:before{content:"\f1b5"}.fa-supple:before{content:"\f3f9"}.fa-webflow:before{content:"\e65c"}.fa-rebel:before{content:"\f1d0"}.fa-css3:before{content:"\f13c"}.fa-staylinked:before{content:"\f3f5"}.fa-kaggle:before{content:"\f5fa"}.fa-space-awesome:before{content:"\e5ac"}.fa-deviantart:before{content:"\f1bd"}.fa-cpanel:before{content:"\f388"}.fa-goodreads-g:before{content:"\f3a9"}.fa-git-square:before,.fa-square-git:before{content:"\f1d2"}.fa-square-tumblr:before,.fa-tumblr-square:before{content:"\f174"}.fa-trello:before{content:"\f181"}.fa-creative-commons-nc-jp:before{content:"\f4ea"}.fa-get-pocket:before{content:"\f265"}.fa-perbyte:before{content:"\e083"}.fa-grunt:before{content:"\f3ad"}.fa-weebly:before{content:"\f5cc"}.fa-connectdevelop:before{content:"\f20e"}.fa-leanpub:before{content:"\f212"}.fa-black-tie:before{content:"\f27e"}.fa-themeco:before{content:"\f5c6"}.fa-python:before{content:"\f3e2"}.fa-android:before{content:"\f17b"}.fa-bots:before{content:"\e340"}.fa-free-code-camp:before{content:"\f2c5"}.fa-hornbill:before{content:"\f592"}.fa-js:before{content:"\f3b8"}.fa-ideal:before{content:"\e013"}.fa-git:before{content:"\f1d3"}.fa-dev:before{content:"\f6cc"}.fa-sketch:before{content:"\f7c6"}.fa-yandex-international:before{content:"\f414"}.fa-cc-amex:before{content:"\f1f3"}.fa-uber:before{content:"\f402"}.fa-github:before{content:"\f09b"}.fa-php:before{content:"\f457"}.fa-alipay:before{content:"\f642"}.fa-youtube:before{content:"\f167"}.fa-skyatlas:before{content:"\f216"}.fa-firefox-browser:before{content:"\e007"}.fa-replyd:before{content:"\f3e6"}.fa-suse:before{content:"\f7d6"}.fa-jenkins:before{content:"\f3b6"}.fa-twitter:before{content:"\f099"}.fa-rockrms:before{content:"\f3e9"}.fa-pinterest:before{content:"\f0d2"}.fa-buffer:before{content:"\f837"}.fa-npm:before{content:"\f3d4"}.fa-yammer:before{content:"\f840"}.fa-btc:before{content:"\f15a"}.fa-dribbble:before{content:"\f17d"}.fa-stumbleupon-circle:before{content:"\f1a3"}.fa-internet-explorer:before{content:"\f26b"}.fa-stubber:before{content:"\e5c7"}.fa-telegram-plane:before,.fa-telegram:before{content:"\f2c6"}.fa-old-republic:before{content:"\f510"}.fa-odysee:before{content:"\e5c6"}.fa-square-whatsapp:before,.fa-whatsapp-square:before{content:"\f40c"}.fa-node-js:before{content:"\f3d3"}.fa-edge-legacy:before{content:"\e078"}.fa-slack-hash:before,.fa-slack:before{content:"\f198"}.fa-medrt:before{content:"\f3c8"}.fa-usb:before{content:"\f287"}.fa-tumblr:before{content:"\f173"}.fa-vaadin:before{content:"\f408"}.fa-quora:before{content:"\f2c4"}.fa-square-x-twitter:before{content:"\e61a"}.fa-reacteurope:before{content:"\f75d"}.fa-medium-m:before,.fa-medium:before{content:"\f23a"}.fa-amilia:before{content:"\f36d"}.fa-mixcloud:before{content:"\f289"}.fa-flipboard:before{content:"\f44d"}.fa-viacoin:before{content:"\f237"}.fa-critical-role:before{content:"\f6c9"}.fa-sitrox:before{content:"\e44a"}.fa-discourse:before{content:"\f393"}.fa-joomla:before{content:"\f1aa"}.fa-mastodon:before{content:"\f4f6"}.fa-airbnb:before{content:"\f834"}.fa-wolf-pack-battalion:before{content:"\f514"}.fa-buy-n-large:before{content:"\f8a6"}.fa-gulp:before{content:"\f3ae"}.fa-creative-commons-sampling-plus:before{content:"\f4f1"}.fa-strava:before{content:"\f428"}.fa-ember:before{content:"\f423"}.fa-canadian-maple-leaf:before{content:"\f785"}.fa-teamspeak:before{content:"\f4f9"}.fa-pushed:before{content:"\f3e1"}.fa-wordpress-simple:before{content:"\f411"}.fa-nutritionix:before{content:"\f3d6"}.fa-wodu:before{content:"\e088"}.fa-google-pay:before{content:"\e079"}.fa-intercom:before{content:"\f7af"}.fa-zhihu:before{content:"\f63f"}.fa-korvue:before{content:"\f42f"}.fa-pix:before{content:"\e43a"}.fa-steam-symbol:before{content:"\f3f6"}:host,:root{--fa-font-regular:normal 400 1em/1 "Font Awesome 6 Free"}@font-face{font-family:"Font Awesome 6 Free";font-style:normal;font-weight:400;font-display:block;src: url("../webfonts/fa-regular-400.woff2") format("woff2"), url("../webfonts/fa-regular-400.ttf") format("truetype"); }.fa-regular,.far{font-weight:400}:host,:root{--fa-style-family-classic:"Font Awesome 6 Free";--fa-font-solid:normal 900 1em/1 "Font Awesome 6 Free"}@font-face{font-family:"Font Awesome 6 Free";font-style:normal;font-weight:900;font-display:block;src: url("../webfonts/fa-solid-900.woff2") format("woff2"), url("../webfonts/fa-solid-900.ttf") format("truetype"); }.fa-solid,.fas{font-weight:900}@font-face{font-family:"Font Awesome 5 Brands";font-display:block;font-weight:400;src: url("../webfonts/fa-brands-400.woff2") format("woff2"), url("../webfonts/fa-brands-400.ttf") format("truetype"); }@font-face{font-family:"Font Awesome 5 Free";font-display:block;font-weight:900;src: url("../webfonts/fa-solid-900.woff2") format("woff2"), url("../webfonts/fa-solid-900.ttf") format("truetype"); }@font-face{font-family:"Font Awesome 5 Free";font-display:block;font-weight:400;src: url("../webfonts/fa-regular-400.woff2") format("woff2"), url("../webfonts/fa-regular-400.ttf") format("truetype"); }@font-face{font-family:"FontAwesome";font-display:block;src: url("../webfonts/fa-solid-900.woff2") format("woff2"), url("../webfonts/fa-solid-900.ttf") format("truetype"); }@font-face{font-family:"FontAwesome";font-display:block;src: url("../webfonts/fa-brands-400.woff2") format("woff2"), url("../webfonts/fa-brands-400.ttf") format("truetype"); }@font-face{font-family:"FontAwesome";font-display:block;src: url("../webfonts/fa-regular-400.woff2") format("woff2"), url("../webfonts/fa-regular-400.ttf") format("truetype"); }@font-face{font-family:"FontAwesome";font-display:block;src: url("../webfonts/fa-v4compatibility.woff2") format("woff2"), url("../webfonts/fa-v4compatibility.ttf") format("truetype"); }fontawesome/inst/fontawesome/css/v4-shims.css0000644000176200001440000012114614605646413021077 0ustar liggesusers/*! * Font Awesome Free 6.5.2 by @fontawesome - https://fontawesome.com * License - https://fontawesome.com/license/free (Icons: CC BY 4.0, Fonts: SIL OFL 1.1, Code: MIT License) * Copyright 2024 Fonticons, Inc. */ .fa.fa-glass:before { content: "\f000"; } .fa.fa-envelope-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-envelope-o:before { content: "\f0e0"; } .fa.fa-star-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-star-o:before { content: "\f005"; } .fa.fa-remove:before { content: "\f00d"; } .fa.fa-close:before { content: "\f00d"; } .fa.fa-gear:before { content: "\f013"; } .fa.fa-trash-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-trash-o:before { content: "\f2ed"; } .fa.fa-home:before { content: "\f015"; } .fa.fa-file-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-o:before { content: "\f15b"; } .fa.fa-clock-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-clock-o:before { content: "\f017"; } .fa.fa-arrow-circle-o-down { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-arrow-circle-o-down:before { content: "\f358"; } .fa.fa-arrow-circle-o-up { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-arrow-circle-o-up:before { content: "\f35b"; } .fa.fa-play-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-play-circle-o:before { content: "\f144"; } .fa.fa-repeat:before { content: "\f01e"; } .fa.fa-rotate-right:before { content: "\f01e"; } .fa.fa-refresh:before { content: "\f021"; } .fa.fa-list-alt { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-list-alt:before { content: "\f022"; } .fa.fa-dedent:before { content: "\f03b"; } .fa.fa-video-camera:before { content: "\f03d"; } .fa.fa-picture-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-picture-o:before { content: "\f03e"; } .fa.fa-photo { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-photo:before { content: "\f03e"; } .fa.fa-image { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-image:before { content: "\f03e"; } .fa.fa-map-marker:before { content: "\f3c5"; } .fa.fa-pencil-square-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-pencil-square-o:before { content: "\f044"; } .fa.fa-edit { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-edit:before { content: "\f044"; } .fa.fa-share-square-o:before { content: "\f14d"; } .fa.fa-check-square-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-check-square-o:before { content: "\f14a"; } .fa.fa-arrows:before { content: "\f0b2"; } .fa.fa-times-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-times-circle-o:before { content: "\f057"; } .fa.fa-check-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-check-circle-o:before { content: "\f058"; } .fa.fa-mail-forward:before { content: "\f064"; } .fa.fa-expand:before { content: "\f424"; } .fa.fa-compress:before { content: "\f422"; } .fa.fa-eye { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-eye-slash { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-warning:before { content: "\f071"; } .fa.fa-calendar:before { content: "\f073"; } .fa.fa-arrows-v:before { content: "\f338"; } .fa.fa-arrows-h:before { content: "\f337"; } .fa.fa-bar-chart:before { content: "\e0e3"; } .fa.fa-bar-chart-o:before { content: "\e0e3"; } .fa.fa-twitter-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-twitter-square:before { content: "\f081"; } .fa.fa-facebook-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-facebook-square:before { content: "\f082"; } .fa.fa-gears:before { content: "\f085"; } .fa.fa-thumbs-o-up { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-thumbs-o-up:before { content: "\f164"; } .fa.fa-thumbs-o-down { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-thumbs-o-down:before { content: "\f165"; } .fa.fa-heart-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-heart-o:before { content: "\f004"; } .fa.fa-sign-out:before { content: "\f2f5"; } .fa.fa-linkedin-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-linkedin-square:before { content: "\f08c"; } .fa.fa-thumb-tack:before { content: "\f08d"; } .fa.fa-external-link:before { content: "\f35d"; } .fa.fa-sign-in:before { content: "\f2f6"; } .fa.fa-github-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-github-square:before { content: "\f092"; } .fa.fa-lemon-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-lemon-o:before { content: "\f094"; } .fa.fa-square-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-square-o:before { content: "\f0c8"; } .fa.fa-bookmark-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-bookmark-o:before { content: "\f02e"; } .fa.fa-twitter { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-facebook { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-facebook:before { content: "\f39e"; } .fa.fa-facebook-f { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-facebook-f:before { content: "\f39e"; } .fa.fa-github { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-credit-card { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-feed:before { content: "\f09e"; } .fa.fa-hdd-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hdd-o:before { content: "\f0a0"; } .fa.fa-hand-o-right { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-o-right:before { content: "\f0a4"; } .fa.fa-hand-o-left { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-o-left:before { content: "\f0a5"; } .fa.fa-hand-o-up { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-o-up:before { content: "\f0a6"; } .fa.fa-hand-o-down { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-o-down:before { content: "\f0a7"; } .fa.fa-globe:before { content: "\f57d"; } .fa.fa-tasks:before { content: "\f828"; } .fa.fa-arrows-alt:before { content: "\f31e"; } .fa.fa-group:before { content: "\f0c0"; } .fa.fa-chain:before { content: "\f0c1"; } .fa.fa-cut:before { content: "\f0c4"; } .fa.fa-files-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-files-o:before { content: "\f0c5"; } .fa.fa-floppy-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-floppy-o:before { content: "\f0c7"; } .fa.fa-save { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-save:before { content: "\f0c7"; } .fa.fa-navicon:before { content: "\f0c9"; } .fa.fa-reorder:before { content: "\f0c9"; } .fa.fa-magic:before { content: "\e2ca"; } .fa.fa-pinterest { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-pinterest-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-pinterest-square:before { content: "\f0d3"; } .fa.fa-google-plus-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-google-plus-square:before { content: "\f0d4"; } .fa.fa-google-plus { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-google-plus:before { content: "\f0d5"; } .fa.fa-money:before { content: "\f3d1"; } .fa.fa-unsorted:before { content: "\f0dc"; } .fa.fa-sort-desc:before { content: "\f0dd"; } .fa.fa-sort-asc:before { content: "\f0de"; } .fa.fa-linkedin { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-linkedin:before { content: "\f0e1"; } .fa.fa-rotate-left:before { content: "\f0e2"; } .fa.fa-legal:before { content: "\f0e3"; } .fa.fa-tachometer:before { content: "\f625"; } .fa.fa-dashboard:before { content: "\f625"; } .fa.fa-comment-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-comment-o:before { content: "\f075"; } .fa.fa-comments-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-comments-o:before { content: "\f086"; } .fa.fa-flash:before { content: "\f0e7"; } .fa.fa-clipboard:before { content: "\f0ea"; } .fa.fa-lightbulb-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-lightbulb-o:before { content: "\f0eb"; } .fa.fa-exchange:before { content: "\f362"; } .fa.fa-cloud-download:before { content: "\f0ed"; } .fa.fa-cloud-upload:before { content: "\f0ee"; } .fa.fa-bell-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-bell-o:before { content: "\f0f3"; } .fa.fa-cutlery:before { content: "\f2e7"; } .fa.fa-file-text-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-text-o:before { content: "\f15c"; } .fa.fa-building-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-building-o:before { content: "\f1ad"; } .fa.fa-hospital-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hospital-o:before { content: "\f0f8"; } .fa.fa-tablet:before { content: "\f3fa"; } .fa.fa-mobile:before { content: "\f3cd"; } .fa.fa-mobile-phone:before { content: "\f3cd"; } .fa.fa-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-circle-o:before { content: "\f111"; } .fa.fa-mail-reply:before { content: "\f3e5"; } .fa.fa-github-alt { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-folder-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-folder-o:before { content: "\f07b"; } .fa.fa-folder-open-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-folder-open-o:before { content: "\f07c"; } .fa.fa-smile-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-smile-o:before { content: "\f118"; } .fa.fa-frown-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-frown-o:before { content: "\f119"; } .fa.fa-meh-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-meh-o:before { content: "\f11a"; } .fa.fa-keyboard-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-keyboard-o:before { content: "\f11c"; } .fa.fa-flag-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-flag-o:before { content: "\f024"; } .fa.fa-mail-reply-all:before { content: "\f122"; } .fa.fa-star-half-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-star-half-o:before { content: "\f5c0"; } .fa.fa-star-half-empty { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-star-half-empty:before { content: "\f5c0"; } .fa.fa-star-half-full { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-star-half-full:before { content: "\f5c0"; } .fa.fa-code-fork:before { content: "\f126"; } .fa.fa-chain-broken:before { content: "\f127"; } .fa.fa-unlink:before { content: "\f127"; } .fa.fa-calendar-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-calendar-o:before { content: "\f133"; } .fa.fa-maxcdn { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-html5 { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-css3 { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-unlock-alt:before { content: "\f09c"; } .fa.fa-minus-square-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-minus-square-o:before { content: "\f146"; } .fa.fa-level-up:before { content: "\f3bf"; } .fa.fa-level-down:before { content: "\f3be"; } .fa.fa-pencil-square:before { content: "\f14b"; } .fa.fa-external-link-square:before { content: "\f360"; } .fa.fa-compass { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-caret-square-o-down { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-caret-square-o-down:before { content: "\f150"; } .fa.fa-toggle-down { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-toggle-down:before { content: "\f150"; } .fa.fa-caret-square-o-up { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-caret-square-o-up:before { content: "\f151"; } .fa.fa-toggle-up { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-toggle-up:before { content: "\f151"; } .fa.fa-caret-square-o-right { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-caret-square-o-right:before { content: "\f152"; } .fa.fa-toggle-right { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-toggle-right:before { content: "\f152"; } .fa.fa-eur:before { content: "\f153"; } .fa.fa-euro:before { content: "\f153"; } .fa.fa-gbp:before { content: "\f154"; } .fa.fa-usd:before { content: "\24"; } .fa.fa-dollar:before { content: "\24"; } .fa.fa-inr:before { content: "\e1bc"; } .fa.fa-rupee:before { content: "\e1bc"; } .fa.fa-jpy:before { content: "\f157"; } .fa.fa-cny:before { content: "\f157"; } .fa.fa-rmb:before { content: "\f157"; } .fa.fa-yen:before { content: "\f157"; } .fa.fa-rub:before { content: "\f158"; } .fa.fa-ruble:before { content: "\f158"; } .fa.fa-rouble:before { content: "\f158"; } .fa.fa-krw:before { content: "\f159"; } .fa.fa-won:before { content: "\f159"; } .fa.fa-btc { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-bitcoin { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-bitcoin:before { content: "\f15a"; } .fa.fa-file-text:before { content: "\f15c"; } .fa.fa-sort-alpha-asc:before { content: "\f15d"; } .fa.fa-sort-alpha-desc:before { content: "\f881"; } .fa.fa-sort-amount-asc:before { content: "\f884"; } .fa.fa-sort-amount-desc:before { content: "\f160"; } .fa.fa-sort-numeric-asc:before { content: "\f162"; } .fa.fa-sort-numeric-desc:before { content: "\f886"; } .fa.fa-youtube-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-youtube-square:before { content: "\f431"; } .fa.fa-youtube { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-xing { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-xing-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-xing-square:before { content: "\f169"; } .fa.fa-youtube-play { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-youtube-play:before { content: "\f167"; } .fa.fa-dropbox { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-stack-overflow { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-instagram { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-flickr { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-adn { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-bitbucket { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-bitbucket-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-bitbucket-square:before { content: "\f171"; } .fa.fa-tumblr { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-tumblr-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-tumblr-square:before { content: "\f174"; } .fa.fa-long-arrow-down:before { content: "\f309"; } .fa.fa-long-arrow-up:before { content: "\f30c"; } .fa.fa-long-arrow-left:before { content: "\f30a"; } .fa.fa-long-arrow-right:before { content: "\f30b"; } .fa.fa-apple { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-windows { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-android { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-linux { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-dribbble { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-skype { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-foursquare { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-trello { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-gratipay { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-gittip { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-gittip:before { content: "\f184"; } .fa.fa-sun-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-sun-o:before { content: "\f185"; } .fa.fa-moon-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-moon-o:before { content: "\f186"; } .fa.fa-vk { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-weibo { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-renren { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-pagelines { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-stack-exchange { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-arrow-circle-o-right { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-arrow-circle-o-right:before { content: "\f35a"; } .fa.fa-arrow-circle-o-left { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-arrow-circle-o-left:before { content: "\f359"; } .fa.fa-caret-square-o-left { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-caret-square-o-left:before { content: "\f191"; } .fa.fa-toggle-left { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-toggle-left:before { content: "\f191"; } .fa.fa-dot-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-dot-circle-o:before { content: "\f192"; } .fa.fa-vimeo-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-vimeo-square:before { content: "\f194"; } .fa.fa-try:before { content: "\e2bb"; } .fa.fa-turkish-lira:before { content: "\e2bb"; } .fa.fa-plus-square-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-plus-square-o:before { content: "\f0fe"; } .fa.fa-slack { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wordpress { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-openid { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-institution:before { content: "\f19c"; } .fa.fa-bank:before { content: "\f19c"; } .fa.fa-mortar-board:before { content: "\f19d"; } .fa.fa-yahoo { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-google { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-reddit { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-reddit-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-reddit-square:before { content: "\f1a2"; } .fa.fa-stumbleupon-circle { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-stumbleupon { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-delicious { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-digg { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-pied-piper-pp { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-pied-piper-alt { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-drupal { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-joomla { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-behance { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-behance-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-behance-square:before { content: "\f1b5"; } .fa.fa-steam { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-steam-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-steam-square:before { content: "\f1b7"; } .fa.fa-automobile:before { content: "\f1b9"; } .fa.fa-cab:before { content: "\f1ba"; } .fa.fa-spotify { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-deviantart { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-soundcloud { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-file-pdf-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-pdf-o:before { content: "\f1c1"; } .fa.fa-file-word-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-word-o:before { content: "\f1c2"; } .fa.fa-file-excel-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-excel-o:before { content: "\f1c3"; } .fa.fa-file-powerpoint-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-powerpoint-o:before { content: "\f1c4"; } .fa.fa-file-image-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-image-o:before { content: "\f1c5"; } .fa.fa-file-photo-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-photo-o:before { content: "\f1c5"; } .fa.fa-file-picture-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-picture-o:before { content: "\f1c5"; } .fa.fa-file-archive-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-archive-o:before { content: "\f1c6"; } .fa.fa-file-zip-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-zip-o:before { content: "\f1c6"; } .fa.fa-file-audio-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-audio-o:before { content: "\f1c7"; } .fa.fa-file-sound-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-sound-o:before { content: "\f1c7"; } .fa.fa-file-video-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-video-o:before { content: "\f1c8"; } .fa.fa-file-movie-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-movie-o:before { content: "\f1c8"; } .fa.fa-file-code-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-file-code-o:before { content: "\f1c9"; } .fa.fa-vine { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-codepen { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-jsfiddle { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-life-bouy:before { content: "\f1cd"; } .fa.fa-life-buoy:before { content: "\f1cd"; } .fa.fa-life-saver:before { content: "\f1cd"; } .fa.fa-support:before { content: "\f1cd"; } .fa.fa-circle-o-notch:before { content: "\f1ce"; } .fa.fa-rebel { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-ra { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-ra:before { content: "\f1d0"; } .fa.fa-resistance { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-resistance:before { content: "\f1d0"; } .fa.fa-empire { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-ge { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-ge:before { content: "\f1d1"; } .fa.fa-git-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-git-square:before { content: "\f1d2"; } .fa.fa-git { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-hacker-news { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-y-combinator-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-y-combinator-square:before { content: "\f1d4"; } .fa.fa-yc-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-yc-square:before { content: "\f1d4"; } .fa.fa-tencent-weibo { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-qq { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-weixin { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wechat { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wechat:before { content: "\f1d7"; } .fa.fa-send:before { content: "\f1d8"; } .fa.fa-paper-plane-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-paper-plane-o:before { content: "\f1d8"; } .fa.fa-send-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-send-o:before { content: "\f1d8"; } .fa.fa-circle-thin { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-circle-thin:before { content: "\f111"; } .fa.fa-header:before { content: "\f1dc"; } .fa.fa-futbol-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-futbol-o:before { content: "\f1e3"; } .fa.fa-soccer-ball-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-soccer-ball-o:before { content: "\f1e3"; } .fa.fa-slideshare { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-twitch { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-yelp { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-newspaper-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-newspaper-o:before { content: "\f1ea"; } .fa.fa-paypal { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-google-wallet { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-cc-visa { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-cc-mastercard { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-cc-discover { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-cc-amex { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-cc-paypal { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-cc-stripe { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-bell-slash-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-bell-slash-o:before { content: "\f1f6"; } .fa.fa-trash:before { content: "\f2ed"; } .fa.fa-copyright { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-eyedropper:before { content: "\f1fb"; } .fa.fa-area-chart:before { content: "\f1fe"; } .fa.fa-pie-chart:before { content: "\f200"; } .fa.fa-line-chart:before { content: "\f201"; } .fa.fa-lastfm { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-lastfm-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-lastfm-square:before { content: "\f203"; } .fa.fa-ioxhost { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-angellist { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-cc { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-cc:before { content: "\f20a"; } .fa.fa-ils:before { content: "\f20b"; } .fa.fa-shekel:before { content: "\f20b"; } .fa.fa-sheqel:before { content: "\f20b"; } .fa.fa-buysellads { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-connectdevelop { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-dashcube { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-forumbee { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-leanpub { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-sellsy { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-shirtsinbulk { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-simplybuilt { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-skyatlas { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-diamond { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-diamond:before { content: "\f3a5"; } .fa.fa-transgender:before { content: "\f224"; } .fa.fa-intersex:before { content: "\f224"; } .fa.fa-transgender-alt:before { content: "\f225"; } .fa.fa-facebook-official { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-facebook-official:before { content: "\f09a"; } .fa.fa-pinterest-p { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-whatsapp { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-hotel:before { content: "\f236"; } .fa.fa-viacoin { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-medium { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-y-combinator { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-yc { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-yc:before { content: "\f23b"; } .fa.fa-optin-monster { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-opencart { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-expeditedssl { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-battery-4:before { content: "\f240"; } .fa.fa-battery:before { content: "\f240"; } .fa.fa-battery-3:before { content: "\f241"; } .fa.fa-battery-2:before { content: "\f242"; } .fa.fa-battery-1:before { content: "\f243"; } .fa.fa-battery-0:before { content: "\f244"; } .fa.fa-object-group { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-object-ungroup { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-sticky-note-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-sticky-note-o:before { content: "\f249"; } .fa.fa-cc-jcb { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-cc-diners-club { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-clone { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hourglass-o:before { content: "\f254"; } .fa.fa-hourglass-1:before { content: "\f251"; } .fa.fa-hourglass-2:before { content: "\f252"; } .fa.fa-hourglass-3:before { content: "\f253"; } .fa.fa-hand-rock-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-rock-o:before { content: "\f255"; } .fa.fa-hand-grab-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-grab-o:before { content: "\f255"; } .fa.fa-hand-paper-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-paper-o:before { content: "\f256"; } .fa.fa-hand-stop-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-stop-o:before { content: "\f256"; } .fa.fa-hand-scissors-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-scissors-o:before { content: "\f257"; } .fa.fa-hand-lizard-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-lizard-o:before { content: "\f258"; } .fa.fa-hand-spock-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-spock-o:before { content: "\f259"; } .fa.fa-hand-pointer-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-pointer-o:before { content: "\f25a"; } .fa.fa-hand-peace-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-hand-peace-o:before { content: "\f25b"; } .fa.fa-registered { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-creative-commons { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-gg { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-gg-circle { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-odnoklassniki { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-odnoklassniki-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-odnoklassniki-square:before { content: "\f264"; } .fa.fa-get-pocket { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wikipedia-w { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-safari { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-chrome { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-firefox { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-opera { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-internet-explorer { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-television:before { content: "\f26c"; } .fa.fa-contao { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-500px { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-amazon { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-calendar-plus-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-calendar-plus-o:before { content: "\f271"; } .fa.fa-calendar-minus-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-calendar-minus-o:before { content: "\f272"; } .fa.fa-calendar-times-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-calendar-times-o:before { content: "\f273"; } .fa.fa-calendar-check-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-calendar-check-o:before { content: "\f274"; } .fa.fa-map-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-map-o:before { content: "\f279"; } .fa.fa-commenting:before { content: "\f4ad"; } .fa.fa-commenting-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-commenting-o:before { content: "\f4ad"; } .fa.fa-houzz { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-vimeo { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-vimeo:before { content: "\f27d"; } .fa.fa-black-tie { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-fonticons { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-reddit-alien { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-edge { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-credit-card-alt:before { content: "\f09d"; } .fa.fa-codiepie { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-modx { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-fort-awesome { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-usb { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-product-hunt { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-mixcloud { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-scribd { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-pause-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-pause-circle-o:before { content: "\f28b"; } .fa.fa-stop-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-stop-circle-o:before { content: "\f28d"; } .fa.fa-bluetooth { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-bluetooth-b { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-gitlab { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wpbeginner { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wpforms { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-envira { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wheelchair-alt { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wheelchair-alt:before { content: "\f368"; } .fa.fa-question-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-question-circle-o:before { content: "\f059"; } .fa.fa-volume-control-phone:before { content: "\f2a0"; } .fa.fa-asl-interpreting:before { content: "\f2a3"; } .fa.fa-deafness:before { content: "\f2a4"; } .fa.fa-hard-of-hearing:before { content: "\f2a4"; } .fa.fa-glide { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-glide-g { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-signing:before { content: "\f2a7"; } .fa.fa-viadeo { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-viadeo-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-viadeo-square:before { content: "\f2aa"; } .fa.fa-snapchat { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-snapchat-ghost { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-snapchat-ghost:before { content: "\f2ab"; } .fa.fa-snapchat-square { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-snapchat-square:before { content: "\f2ad"; } .fa.fa-pied-piper { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-first-order { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-yoast { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-themeisle { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-google-plus-official { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-google-plus-official:before { content: "\f2b3"; } .fa.fa-google-plus-circle { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-google-plus-circle:before { content: "\f2b3"; } .fa.fa-font-awesome { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-fa { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-fa:before { content: "\f2b4"; } .fa.fa-handshake-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-handshake-o:before { content: "\f2b5"; } .fa.fa-envelope-open-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-envelope-open-o:before { content: "\f2b6"; } .fa.fa-linode { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-address-book-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-address-book-o:before { content: "\f2b9"; } .fa.fa-vcard:before { content: "\f2bb"; } .fa.fa-address-card-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-address-card-o:before { content: "\f2bb"; } .fa.fa-vcard-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-vcard-o:before { content: "\f2bb"; } .fa.fa-user-circle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-user-circle-o:before { content: "\f2bd"; } .fa.fa-user-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-user-o:before { content: "\f007"; } .fa.fa-id-badge { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-drivers-license:before { content: "\f2c2"; } .fa.fa-id-card-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-id-card-o:before { content: "\f2c2"; } .fa.fa-drivers-license-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-drivers-license-o:before { content: "\f2c2"; } .fa.fa-quora { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-free-code-camp { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-telegram { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-thermometer-4:before { content: "\f2c7"; } .fa.fa-thermometer:before { content: "\f2c7"; } .fa.fa-thermometer-3:before { content: "\f2c8"; } .fa.fa-thermometer-2:before { content: "\f2c9"; } .fa.fa-thermometer-1:before { content: "\f2ca"; } .fa.fa-thermometer-0:before { content: "\f2cb"; } .fa.fa-bathtub:before { content: "\f2cd"; } .fa.fa-s15:before { content: "\f2cd"; } .fa.fa-window-maximize { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-window-restore { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-times-rectangle:before { content: "\f410"; } .fa.fa-window-close-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-window-close-o:before { content: "\f410"; } .fa.fa-times-rectangle-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-times-rectangle-o:before { content: "\f410"; } .fa.fa-bandcamp { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-grav { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-etsy { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-imdb { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-ravelry { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-eercast { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-eercast:before { content: "\f2da"; } .fa.fa-snowflake-o { font-family: 'Font Awesome 6 Free'; font-weight: 400; } .fa.fa-snowflake-o:before { content: "\f2dc"; } .fa.fa-superpowers { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-wpexplorer { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } .fa.fa-meetup { font-family: 'Font Awesome 6 Brands'; font-weight: 400; } fontawesome/inst/fontawesome/css/v4-shims.min.css0000644000176200001440000006571114605646413021666 0ustar liggesusers/*! * Font Awesome Free 6.5.2 by @fontawesome - https://fontawesome.com * License - https://fontawesome.com/license/free (Icons: CC BY 4.0, Fonts: SIL OFL 1.1, Code: MIT License) * Copyright 2024 Fonticons, Inc. */ .fa.fa-glass:before{content:"\f000"}.fa.fa-envelope-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-envelope-o:before{content:"\f0e0"}.fa.fa-star-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-star-o:before{content:"\f005"}.fa.fa-close:before,.fa.fa-remove:before{content:"\f00d"}.fa.fa-gear:before{content:"\f013"}.fa.fa-trash-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-trash-o:before{content:"\f2ed"}.fa.fa-home:before{content:"\f015"}.fa.fa-file-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-o:before{content:"\f15b"}.fa.fa-clock-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-clock-o:before{content:"\f017"}.fa.fa-arrow-circle-o-down{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-arrow-circle-o-down:before{content:"\f358"}.fa.fa-arrow-circle-o-up{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-arrow-circle-o-up:before{content:"\f35b"}.fa.fa-play-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-play-circle-o:before{content:"\f144"}.fa.fa-repeat:before,.fa.fa-rotate-right:before{content:"\f01e"}.fa.fa-refresh:before{content:"\f021"}.fa.fa-list-alt{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-list-alt:before{content:"\f022"}.fa.fa-dedent:before{content:"\f03b"}.fa.fa-video-camera:before{content:"\f03d"}.fa.fa-picture-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-picture-o:before{content:"\f03e"}.fa.fa-photo{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-photo:before{content:"\f03e"}.fa.fa-image{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-image:before{content:"\f03e"}.fa.fa-map-marker:before{content:"\f3c5"}.fa.fa-pencil-square-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-pencil-square-o:before{content:"\f044"}.fa.fa-edit{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-edit:before{content:"\f044"}.fa.fa-share-square-o:before{content:"\f14d"}.fa.fa-check-square-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-check-square-o:before{content:"\f14a"}.fa.fa-arrows:before{content:"\f0b2"}.fa.fa-times-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-times-circle-o:before{content:"\f057"}.fa.fa-check-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-check-circle-o:before{content:"\f058"}.fa.fa-mail-forward:before{content:"\f064"}.fa.fa-expand:before{content:"\f424"}.fa.fa-compress:before{content:"\f422"}.fa.fa-eye,.fa.fa-eye-slash{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-warning:before{content:"\f071"}.fa.fa-calendar:before{content:"\f073"}.fa.fa-arrows-v:before{content:"\f338"}.fa.fa-arrows-h:before{content:"\f337"}.fa.fa-bar-chart-o:before,.fa.fa-bar-chart:before{content:"\e0e3"}.fa.fa-twitter-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-twitter-square:before{content:"\f081"}.fa.fa-facebook-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-facebook-square:before{content:"\f082"}.fa.fa-gears:before{content:"\f085"}.fa.fa-thumbs-o-up{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-thumbs-o-up:before{content:"\f164"}.fa.fa-thumbs-o-down{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-thumbs-o-down:before{content:"\f165"}.fa.fa-heart-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-heart-o:before{content:"\f004"}.fa.fa-sign-out:before{content:"\f2f5"}.fa.fa-linkedin-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-linkedin-square:before{content:"\f08c"}.fa.fa-thumb-tack:before{content:"\f08d"}.fa.fa-external-link:before{content:"\f35d"}.fa.fa-sign-in:before{content:"\f2f6"}.fa.fa-github-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-github-square:before{content:"\f092"}.fa.fa-lemon-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-lemon-o:before{content:"\f094"}.fa.fa-square-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-square-o:before{content:"\f0c8"}.fa.fa-bookmark-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-bookmark-o:before{content:"\f02e"}.fa.fa-facebook,.fa.fa-twitter{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-facebook:before{content:"\f39e"}.fa.fa-facebook-f{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-facebook-f:before{content:"\f39e"}.fa.fa-github{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-credit-card{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-feed:before{content:"\f09e"}.fa.fa-hdd-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hdd-o:before{content:"\f0a0"}.fa.fa-hand-o-right{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-o-right:before{content:"\f0a4"}.fa.fa-hand-o-left{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-o-left:before{content:"\f0a5"}.fa.fa-hand-o-up{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-o-up:before{content:"\f0a6"}.fa.fa-hand-o-down{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-o-down:before{content:"\f0a7"}.fa.fa-globe:before{content:"\f57d"}.fa.fa-tasks:before{content:"\f828"}.fa.fa-arrows-alt:before{content:"\f31e"}.fa.fa-group:before{content:"\f0c0"}.fa.fa-chain:before{content:"\f0c1"}.fa.fa-cut:before{content:"\f0c4"}.fa.fa-files-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-files-o:before{content:"\f0c5"}.fa.fa-floppy-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-floppy-o:before{content:"\f0c7"}.fa.fa-save{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-save:before{content:"\f0c7"}.fa.fa-navicon:before,.fa.fa-reorder:before{content:"\f0c9"}.fa.fa-magic:before{content:"\e2ca"}.fa.fa-pinterest,.fa.fa-pinterest-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-pinterest-square:before{content:"\f0d3"}.fa.fa-google-plus-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-google-plus-square:before{content:"\f0d4"}.fa.fa-google-plus{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-google-plus:before{content:"\f0d5"}.fa.fa-money:before{content:"\f3d1"}.fa.fa-unsorted:before{content:"\f0dc"}.fa.fa-sort-desc:before{content:"\f0dd"}.fa.fa-sort-asc:before{content:"\f0de"}.fa.fa-linkedin{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-linkedin:before{content:"\f0e1"}.fa.fa-rotate-left:before{content:"\f0e2"}.fa.fa-legal:before{content:"\f0e3"}.fa.fa-dashboard:before,.fa.fa-tachometer:before{content:"\f625"}.fa.fa-comment-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-comment-o:before{content:"\f075"}.fa.fa-comments-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-comments-o:before{content:"\f086"}.fa.fa-flash:before{content:"\f0e7"}.fa.fa-clipboard:before{content:"\f0ea"}.fa.fa-lightbulb-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-lightbulb-o:before{content:"\f0eb"}.fa.fa-exchange:before{content:"\f362"}.fa.fa-cloud-download:before{content:"\f0ed"}.fa.fa-cloud-upload:before{content:"\f0ee"}.fa.fa-bell-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-bell-o:before{content:"\f0f3"}.fa.fa-cutlery:before{content:"\f2e7"}.fa.fa-file-text-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-text-o:before{content:"\f15c"}.fa.fa-building-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-building-o:before{content:"\f1ad"}.fa.fa-hospital-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hospital-o:before{content:"\f0f8"}.fa.fa-tablet:before{content:"\f3fa"}.fa.fa-mobile-phone:before,.fa.fa-mobile:before{content:"\f3cd"}.fa.fa-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-circle-o:before{content:"\f111"}.fa.fa-mail-reply:before{content:"\f3e5"}.fa.fa-github-alt{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-folder-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-folder-o:before{content:"\f07b"}.fa.fa-folder-open-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-folder-open-o:before{content:"\f07c"}.fa.fa-smile-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-smile-o:before{content:"\f118"}.fa.fa-frown-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-frown-o:before{content:"\f119"}.fa.fa-meh-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-meh-o:before{content:"\f11a"}.fa.fa-keyboard-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-keyboard-o:before{content:"\f11c"}.fa.fa-flag-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-flag-o:before{content:"\f024"}.fa.fa-mail-reply-all:before{content:"\f122"}.fa.fa-star-half-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-star-half-o:before{content:"\f5c0"}.fa.fa-star-half-empty{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-star-half-empty:before{content:"\f5c0"}.fa.fa-star-half-full{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-star-half-full:before{content:"\f5c0"}.fa.fa-code-fork:before{content:"\f126"}.fa.fa-chain-broken:before,.fa.fa-unlink:before{content:"\f127"}.fa.fa-calendar-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-calendar-o:before{content:"\f133"}.fa.fa-css3,.fa.fa-html5,.fa.fa-maxcdn{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-unlock-alt:before{content:"\f09c"}.fa.fa-minus-square-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-minus-square-o:before{content:"\f146"}.fa.fa-level-up:before{content:"\f3bf"}.fa.fa-level-down:before{content:"\f3be"}.fa.fa-pencil-square:before{content:"\f14b"}.fa.fa-external-link-square:before{content:"\f360"}.fa.fa-compass{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-caret-square-o-down{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-caret-square-o-down:before{content:"\f150"}.fa.fa-toggle-down{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-toggle-down:before{content:"\f150"}.fa.fa-caret-square-o-up{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-caret-square-o-up:before{content:"\f151"}.fa.fa-toggle-up{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-toggle-up:before{content:"\f151"}.fa.fa-caret-square-o-right{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-caret-square-o-right:before{content:"\f152"}.fa.fa-toggle-right{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-toggle-right:before{content:"\f152"}.fa.fa-eur:before,.fa.fa-euro:before{content:"\f153"}.fa.fa-gbp:before{content:"\f154"}.fa.fa-dollar:before,.fa.fa-usd:before{content:"\24"}.fa.fa-inr:before,.fa.fa-rupee:before{content:"\e1bc"}.fa.fa-cny:before,.fa.fa-jpy:before,.fa.fa-rmb:before,.fa.fa-yen:before{content:"\f157"}.fa.fa-rouble:before,.fa.fa-rub:before,.fa.fa-ruble:before{content:"\f158"}.fa.fa-krw:before,.fa.fa-won:before{content:"\f159"}.fa.fa-bitcoin,.fa.fa-btc{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-bitcoin:before{content:"\f15a"}.fa.fa-file-text:before{content:"\f15c"}.fa.fa-sort-alpha-asc:before{content:"\f15d"}.fa.fa-sort-alpha-desc:before{content:"\f881"}.fa.fa-sort-amount-asc:before{content:"\f884"}.fa.fa-sort-amount-desc:before{content:"\f160"}.fa.fa-sort-numeric-asc:before{content:"\f162"}.fa.fa-sort-numeric-desc:before{content:"\f886"}.fa.fa-youtube-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-youtube-square:before{content:"\f431"}.fa.fa-xing,.fa.fa-xing-square,.fa.fa-youtube{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-xing-square:before{content:"\f169"}.fa.fa-youtube-play{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-youtube-play:before{content:"\f167"}.fa.fa-adn,.fa.fa-bitbucket,.fa.fa-bitbucket-square,.fa.fa-dropbox,.fa.fa-flickr,.fa.fa-instagram,.fa.fa-stack-overflow{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-bitbucket-square:before{content:"\f171"}.fa.fa-tumblr,.fa.fa-tumblr-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-tumblr-square:before{content:"\f174"}.fa.fa-long-arrow-down:before{content:"\f309"}.fa.fa-long-arrow-up:before{content:"\f30c"}.fa.fa-long-arrow-left:before{content:"\f30a"}.fa.fa-long-arrow-right:before{content:"\f30b"}.fa.fa-android,.fa.fa-apple,.fa.fa-dribbble,.fa.fa-foursquare,.fa.fa-gittip,.fa.fa-gratipay,.fa.fa-linux,.fa.fa-skype,.fa.fa-trello,.fa.fa-windows{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-gittip:before{content:"\f184"}.fa.fa-sun-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-sun-o:before{content:"\f185"}.fa.fa-moon-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-moon-o:before{content:"\f186"}.fa.fa-pagelines,.fa.fa-renren,.fa.fa-stack-exchange,.fa.fa-vk,.fa.fa-weibo{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-arrow-circle-o-right{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-arrow-circle-o-right:before{content:"\f35a"}.fa.fa-arrow-circle-o-left{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-arrow-circle-o-left:before{content:"\f359"}.fa.fa-caret-square-o-left{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-caret-square-o-left:before{content:"\f191"}.fa.fa-toggle-left{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-toggle-left:before{content:"\f191"}.fa.fa-dot-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-dot-circle-o:before{content:"\f192"}.fa.fa-vimeo-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-vimeo-square:before{content:"\f194"}.fa.fa-try:before,.fa.fa-turkish-lira:before{content:"\e2bb"}.fa.fa-plus-square-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-plus-square-o:before{content:"\f0fe"}.fa.fa-openid,.fa.fa-slack,.fa.fa-wordpress{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-bank:before,.fa.fa-institution:before{content:"\f19c"}.fa.fa-mortar-board:before{content:"\f19d"}.fa.fa-google,.fa.fa-reddit,.fa.fa-reddit-square,.fa.fa-yahoo{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-reddit-square:before{content:"\f1a2"}.fa.fa-behance,.fa.fa-behance-square,.fa.fa-delicious,.fa.fa-digg,.fa.fa-drupal,.fa.fa-joomla,.fa.fa-pied-piper-alt,.fa.fa-pied-piper-pp,.fa.fa-stumbleupon,.fa.fa-stumbleupon-circle{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-behance-square:before{content:"\f1b5"}.fa.fa-steam,.fa.fa-steam-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-steam-square:before{content:"\f1b7"}.fa.fa-automobile:before{content:"\f1b9"}.fa.fa-cab:before{content:"\f1ba"}.fa.fa-deviantart,.fa.fa-soundcloud,.fa.fa-spotify{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-file-pdf-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-pdf-o:before{content:"\f1c1"}.fa.fa-file-word-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-word-o:before{content:"\f1c2"}.fa.fa-file-excel-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-excel-o:before{content:"\f1c3"}.fa.fa-file-powerpoint-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-powerpoint-o:before{content:"\f1c4"}.fa.fa-file-image-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-image-o:before{content:"\f1c5"}.fa.fa-file-photo-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-photo-o:before{content:"\f1c5"}.fa.fa-file-picture-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-picture-o:before{content:"\f1c5"}.fa.fa-file-archive-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-archive-o:before{content:"\f1c6"}.fa.fa-file-zip-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-zip-o:before{content:"\f1c6"}.fa.fa-file-audio-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-audio-o:before{content:"\f1c7"}.fa.fa-file-sound-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-sound-o:before{content:"\f1c7"}.fa.fa-file-video-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-video-o:before{content:"\f1c8"}.fa.fa-file-movie-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-movie-o:before{content:"\f1c8"}.fa.fa-file-code-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-file-code-o:before{content:"\f1c9"}.fa.fa-codepen,.fa.fa-jsfiddle,.fa.fa-vine{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-life-bouy:before,.fa.fa-life-buoy:before,.fa.fa-life-saver:before,.fa.fa-support:before{content:"\f1cd"}.fa.fa-circle-o-notch:before{content:"\f1ce"}.fa.fa-ra,.fa.fa-rebel{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-ra:before{content:"\f1d0"}.fa.fa-resistance{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-resistance:before{content:"\f1d0"}.fa.fa-empire,.fa.fa-ge{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-ge:before{content:"\f1d1"}.fa.fa-git-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-git-square:before{content:"\f1d2"}.fa.fa-git,.fa.fa-hacker-news,.fa.fa-y-combinator-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-y-combinator-square:before{content:"\f1d4"}.fa.fa-yc-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-yc-square:before{content:"\f1d4"}.fa.fa-qq,.fa.fa-tencent-weibo,.fa.fa-wechat,.fa.fa-weixin{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-wechat:before{content:"\f1d7"}.fa.fa-send:before{content:"\f1d8"}.fa.fa-paper-plane-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-paper-plane-o:before{content:"\f1d8"}.fa.fa-send-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-send-o:before{content:"\f1d8"}.fa.fa-circle-thin{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-circle-thin:before{content:"\f111"}.fa.fa-header:before{content:"\f1dc"}.fa.fa-futbol-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-futbol-o:before{content:"\f1e3"}.fa.fa-soccer-ball-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-soccer-ball-o:before{content:"\f1e3"}.fa.fa-slideshare,.fa.fa-twitch,.fa.fa-yelp{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-newspaper-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-newspaper-o:before{content:"\f1ea"}.fa.fa-cc-amex,.fa.fa-cc-discover,.fa.fa-cc-mastercard,.fa.fa-cc-paypal,.fa.fa-cc-stripe,.fa.fa-cc-visa,.fa.fa-google-wallet,.fa.fa-paypal{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-bell-slash-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-bell-slash-o:before{content:"\f1f6"}.fa.fa-trash:before{content:"\f2ed"}.fa.fa-copyright{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-eyedropper:before{content:"\f1fb"}.fa.fa-area-chart:before{content:"\f1fe"}.fa.fa-pie-chart:before{content:"\f200"}.fa.fa-line-chart:before{content:"\f201"}.fa.fa-lastfm,.fa.fa-lastfm-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-lastfm-square:before{content:"\f203"}.fa.fa-angellist,.fa.fa-ioxhost{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-cc{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-cc:before{content:"\f20a"}.fa.fa-ils:before,.fa.fa-shekel:before,.fa.fa-sheqel:before{content:"\f20b"}.fa.fa-buysellads,.fa.fa-connectdevelop,.fa.fa-dashcube,.fa.fa-forumbee,.fa.fa-leanpub,.fa.fa-sellsy,.fa.fa-shirtsinbulk,.fa.fa-simplybuilt,.fa.fa-skyatlas{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-diamond{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-diamond:before{content:"\f3a5"}.fa.fa-intersex:before,.fa.fa-transgender:before{content:"\f224"}.fa.fa-transgender-alt:before{content:"\f225"}.fa.fa-facebook-official{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-facebook-official:before{content:"\f09a"}.fa.fa-pinterest-p,.fa.fa-whatsapp{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-hotel:before{content:"\f236"}.fa.fa-medium,.fa.fa-viacoin,.fa.fa-y-combinator,.fa.fa-yc{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-yc:before{content:"\f23b"}.fa.fa-expeditedssl,.fa.fa-opencart,.fa.fa-optin-monster{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-battery-4:before,.fa.fa-battery:before{content:"\f240"}.fa.fa-battery-3:before{content:"\f241"}.fa.fa-battery-2:before{content:"\f242"}.fa.fa-battery-1:before{content:"\f243"}.fa.fa-battery-0:before{content:"\f244"}.fa.fa-object-group,.fa.fa-object-ungroup,.fa.fa-sticky-note-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-sticky-note-o:before{content:"\f249"}.fa.fa-cc-diners-club,.fa.fa-cc-jcb{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-clone{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hourglass-o:before{content:"\f254"}.fa.fa-hourglass-1:before{content:"\f251"}.fa.fa-hourglass-2:before{content:"\f252"}.fa.fa-hourglass-3:before{content:"\f253"}.fa.fa-hand-rock-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-rock-o:before{content:"\f255"}.fa.fa-hand-grab-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-grab-o:before{content:"\f255"}.fa.fa-hand-paper-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-paper-o:before{content:"\f256"}.fa.fa-hand-stop-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-stop-o:before{content:"\f256"}.fa.fa-hand-scissors-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-scissors-o:before{content:"\f257"}.fa.fa-hand-lizard-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-lizard-o:before{content:"\f258"}.fa.fa-hand-spock-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-spock-o:before{content:"\f259"}.fa.fa-hand-pointer-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-pointer-o:before{content:"\f25a"}.fa.fa-hand-peace-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-hand-peace-o:before{content:"\f25b"}.fa.fa-registered{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-creative-commons,.fa.fa-gg,.fa.fa-gg-circle,.fa.fa-odnoklassniki,.fa.fa-odnoklassniki-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-odnoklassniki-square:before{content:"\f264"}.fa.fa-chrome,.fa.fa-firefox,.fa.fa-get-pocket,.fa.fa-internet-explorer,.fa.fa-opera,.fa.fa-safari,.fa.fa-wikipedia-w{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-television:before{content:"\f26c"}.fa.fa-500px,.fa.fa-amazon,.fa.fa-contao{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-calendar-plus-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-calendar-plus-o:before{content:"\f271"}.fa.fa-calendar-minus-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-calendar-minus-o:before{content:"\f272"}.fa.fa-calendar-times-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-calendar-times-o:before{content:"\f273"}.fa.fa-calendar-check-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-calendar-check-o:before{content:"\f274"}.fa.fa-map-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-map-o:before{content:"\f279"}.fa.fa-commenting:before{content:"\f4ad"}.fa.fa-commenting-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-commenting-o:before{content:"\f4ad"}.fa.fa-houzz,.fa.fa-vimeo{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-vimeo:before{content:"\f27d"}.fa.fa-black-tie,.fa.fa-edge,.fa.fa-fonticons,.fa.fa-reddit-alien{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-credit-card-alt:before{content:"\f09d"}.fa.fa-codiepie,.fa.fa-fort-awesome,.fa.fa-mixcloud,.fa.fa-modx,.fa.fa-product-hunt,.fa.fa-scribd,.fa.fa-usb{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-pause-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-pause-circle-o:before{content:"\f28b"}.fa.fa-stop-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-stop-circle-o:before{content:"\f28d"}.fa.fa-bluetooth,.fa.fa-bluetooth-b,.fa.fa-envira,.fa.fa-gitlab,.fa.fa-wheelchair-alt,.fa.fa-wpbeginner,.fa.fa-wpforms{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-wheelchair-alt:before{content:"\f368"}.fa.fa-question-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-question-circle-o:before{content:"\f059"}.fa.fa-volume-control-phone:before{content:"\f2a0"}.fa.fa-asl-interpreting:before{content:"\f2a3"}.fa.fa-deafness:before,.fa.fa-hard-of-hearing:before{content:"\f2a4"}.fa.fa-glide,.fa.fa-glide-g{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-signing:before{content:"\f2a7"}.fa.fa-viadeo,.fa.fa-viadeo-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-viadeo-square:before{content:"\f2aa"}.fa.fa-snapchat,.fa.fa-snapchat-ghost{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-snapchat-ghost:before{content:"\f2ab"}.fa.fa-snapchat-square{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-snapchat-square:before{content:"\f2ad"}.fa.fa-first-order,.fa.fa-google-plus-official,.fa.fa-pied-piper,.fa.fa-themeisle,.fa.fa-yoast{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-google-plus-official:before{content:"\f2b3"}.fa.fa-google-plus-circle{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-google-plus-circle:before{content:"\f2b3"}.fa.fa-fa,.fa.fa-font-awesome{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-fa:before{content:"\f2b4"}.fa.fa-handshake-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-handshake-o:before{content:"\f2b5"}.fa.fa-envelope-open-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-envelope-open-o:before{content:"\f2b6"}.fa.fa-linode{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-address-book-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-address-book-o:before{content:"\f2b9"}.fa.fa-vcard:before{content:"\f2bb"}.fa.fa-address-card-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-address-card-o:before{content:"\f2bb"}.fa.fa-vcard-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-vcard-o:before{content:"\f2bb"}.fa.fa-user-circle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-user-circle-o:before{content:"\f2bd"}.fa.fa-user-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-user-o:before{content:"\f007"}.fa.fa-id-badge{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-drivers-license:before{content:"\f2c2"}.fa.fa-id-card-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-id-card-o:before{content:"\f2c2"}.fa.fa-drivers-license-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-drivers-license-o:before{content:"\f2c2"}.fa.fa-free-code-camp,.fa.fa-quora,.fa.fa-telegram{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-thermometer-4:before,.fa.fa-thermometer:before{content:"\f2c7"}.fa.fa-thermometer-3:before{content:"\f2c8"}.fa.fa-thermometer-2:before{content:"\f2c9"}.fa.fa-thermometer-1:before{content:"\f2ca"}.fa.fa-thermometer-0:before{content:"\f2cb"}.fa.fa-bathtub:before,.fa.fa-s15:before{content:"\f2cd"}.fa.fa-window-maximize,.fa.fa-window-restore{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-times-rectangle:before{content:"\f410"}.fa.fa-window-close-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-window-close-o:before{content:"\f410"}.fa.fa-times-rectangle-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-times-rectangle-o:before{content:"\f410"}.fa.fa-bandcamp,.fa.fa-eercast,.fa.fa-etsy,.fa.fa-grav,.fa.fa-imdb,.fa.fa-ravelry{font-family:"Font Awesome 6 Brands";font-weight:400}.fa.fa-eercast:before{content:"\f2da"}.fa.fa-snowflake-o{font-family:"Font Awesome 6 Free";font-weight:400}.fa.fa-snowflake-o:before{content:"\f2dc"}.fa.fa-meetup,.fa.fa-superpowers,.fa.fa-wpexplorer{font-family:"Font Awesome 6 Brands";font-weight:400}fontawesome/inst/fontawesome/webfonts/0000755000176200001440000000000014605646413017745 5ustar liggesusersfontawesome/inst/fontawesome/webfonts/fa-solid-900.ttf0000644000176200001440000146475414605646413022515 0ustar liggesusers  OS/2akbS(`cmapipLHglyf9Fuhead)Ԉ6hheaL$hmtxloca)X_maxp name0postUMx_< 1Dž1DžqqLfGLf AWSM!KA @@ @@@@@@@@@@@@@@@@ @@@@@@@ @ @@ @ @!!@@@@@   @@@@@@@@@@@@ @@@@@@@  @@ @ @    @@@@@@@@@@@@@@ @@@@@@@@@@@@@@@@@@@@@@@@@@:@@@ @ @"@@@@@@    @@@@@@@@@@ @@@@   @@@@@@@@@@@@@@  @@@@ @@@ @@@@@@@@@@   @  @ @@  @@@ @'@@@@@@@'@'@@@'@'  @@@@@ @ @ @@@ @@@@` @ @@@@@@@ @ @ @@@@@   @@@@@@@@@@@ @@@@@@ @@@@@@ @@@ @@@@ @@@@@@@@ @@ @@@@@@@@@@@@@  @ @@@@@@@@@@@@ @@@@@ @@@@@@@@@  @@@@@@ @@@@@ @@@@@@@@@@@@ @@ @@'@'@@@'@'@$$ j !%+9Zabcdefghijklmnopqrstuvwxyz    9 : !"!!!!!!!!!!""####(#)#*#+############$%%%%%%&&&&&&&& &"&#&%&*&,&.&/&8&9&?&@&B&Z&[&\&]&^&_&e&f&r&z&{&~&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&''''' ' ' ' '''''''''!'1'D'F'L'N'S'T'U'W'd''')4)5+ +++$+P Av1<@Rcim{ "-=@DEFN[\]^fghin~ "#'()*.5:>FGNTUY^ex -69IJNP]lwxz{ (28[]`c"$%46:JLPS^cmy}!#*0<abcdefghijklmnopqrstuvwxyz    9 : !"!!!!!!!!!!""####(#)#*#+############$%%%%%%&&&&&&&& &"&#&%&*&,&.&/&8&9&?&@&B&Z&[&\&]&^&_&e&f&r&z&{&~&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&&''''' ' ' ' '''''''''!'1'D'F'L'N'S'T'U'W'd''')4)5+ +++$+P ?Y19@Rcim{ !-=JLPS^cmy{ + % !~2+(v_UFpWON+%#!   ~|zywvutsrpnmlkjhedcbUTPONKJGFEDC=<;:987643210/.    ~sqpolhg`XWUSPNLHEB32)spjaPOBA?><;:985320,)('$#!  ~ytsqnkeb^\ZXTSRPLIHFED@?>=;:8,+'"!  } { z y w v p n l k j i f e d c _ V Q O M L K I C A < ; : 8 7 3 * &   q@B`T  :$(Db~~<vxrP&rrVrdZ|t|vv|n.22&((<.2.&"&n0&@LJx>(.06N~NL86<xp8:4  jr4@<jj2dRzHrz|xvBDfdb`t\|`fHpnf\4 !"#$%&'()*+,-./ %/02789=?EFGJKLMQRTVYqwy|  ')*+,.:<=>@BHRSTUVWY^`akquy{|}~bc&(/469 0!!#%*+09<Zaabbccddeeffgghhiijjkk ll!mm"nn#oo$pp%qq&rr'ss(tt)uu*vv+ww,xx-yy.zz/FG    Q  R 9 9J : :K       6 !"!" !!!!!!!!!!R!!S!!Y!!0!!!!7""""##L##M###(#(Y#)#)#*#*#+#+##############B##########$$%%%%%%T%%%%%%&&&&&&4&&&&|&&&&& & & &"&"(&#&#&%&%&*&*&,&,&.&.&/&/&8&8&9&9V&?&?&@&@&B&B&Z&Z{&[&[~&\&\&]&]y&^&^|&_&_}&e&e&f&f&r&r&z&z&{&{&~&~&&&&&&&&&&&&&&q&&&&&&&&&&2&&&&&&&&&&&&&&&&&&T&&T&&&&&&u&&4&&&&&&%&&&&&&/&&&&''''''''|' ' /' ' ' ' ' '  ''H''c''b'''''''''''!'!'1'1'D'D<'F'F<'L'L'N'N:'S'S'T'T'U'U'W'W'd'd'''''')4)4a)5)5`+ + S+++++$+$T+P+P0 23?A4Yv7UWYZ[\]^9_`a11c9<d@@hRRiccjiikmml{{mnpqstuvwxyz{|}~ !"--==<<EEGHllssvwz{%'/2OQX9ZoAqtWv[mt~xxzz/@TWw!>@@HADEEFF|GNP[\\]]^^`fgghhiijnp~=$&/02:>?F^ N T QSkUZ "[##$'^(())b**+.c05g7:m=>q@FsGGyHNzPTUUVY[^`euxVUE=T !-3689@IJJMNPPQ]llqwxxyz{{ %')**++,,-./7q;=>?@ACEFG KOP((Q2278RX[T]]X``YbcZ89\^_`bcdehijklmopq""r$$s%%'24t66w9:x<<z??{AA|CC}EE~GGKKNNPPSSXX\]__abffhmprttwy}}?~' +,,-01125667@AABMX\`hjmqx}!!$%)*.077;<AADDGGJJOOQQSUXX]^bbdfikmmoottvvxy{| ""()++./;=@@CCGGMMQSVVZ[^_iikloprs |}  #%')*,-/1456:=>?ABCEF   IJLMOP'*Q//U>>VJJWLLXPPYSSZ^^[cc\mm]yy^{}_bdhijlmnop     789!!1&&''))**--J112266NKKNNOOhhKjjtt>wwxx6dxvZ3[v{?N  3AAMMNNQQUUddee{{_ 6FPNjjQOM+fm[A        =%%''((,,44T55TGGIIJJKKLLMMNNSSkknnqquuww{{}}^/IbG ^l87;TC<=>@    l  ?WPRQDFE  ""i&&5++y,,:--h..t33466\BBUDD]j@%91W745ife*TTTTT  ##A))BAA$BBCCDD=NNuSS;UUZZDwwzfk <Lyyzz;8 dd@    P @<  00 0 D !("x#%@)*+,.1235 6X7h89:=x??@ACD EpFGHIJLpMP0QS0STXU8V8WDXlXYZ[\]^|`a\bce,ffgi8j0jk\llmoPp pqrsXtuXvTwxx@xyz{|\}t~\dd@l\L( PH\X$Pt@ 0lTHx`„À<ǼX֔؈p@ߨ8`H$0@hhLxXtx  |   Lp|h(p \"h#($%X&'()*X+,$-l..0P12(35(68:H<=,>?P@HBCEG8I$JpKLN4OLP`QRTUhVX\Y[4\$]^`Da0bxdefgipkm$nopqsuv\wxz{p|~~,dT( pXHX\PDlHHT|8Dh<, Ũ @tʌ4˨ ̬xDt4הdLڰ4\pPP<dhDt|T  Lt$x d< , P    p T\ld$lD 4!"<#,$$%,%&'`(L)* +|,.,/0$01`23835056P7<89:X;<<=>8>?@@hACCDEFGGXGGHHIIXIJ JKL$M|NO\PPQRpSTUV\WX|Y[\\]^H^_`4`a,aab0bc0cdefg h,i4jkm|nohpLqq\r(s`tu8v@wHwyyz{,{|}~~0(,p pxH,ptth8xtTXLL<\|@l, İ( njX ϰpѨҔԤhְlڔTܠp|0,8,$4|lThht  <p   X D  ,(<d,dhP| !"%')t*,--/l/12 23456789;<=>>?@XACD$E,EFGHIlJHJLTM`N\NOOPHPQQRSTTU0UVW@X XYZ`[\\]`]^X^_`a(ab,cpd$delefggh(hitjjlm motp(q8rrspt\uPv`wLxyyz{|}~ ,`@l,l|l \l@0Xx48 <x$T (ˆ|\|Dμh ӌԜd0tشH۸ܘLހL $0,|$d,x<0p`d  P  x8$XTlH|, "T#`$%h& '()*+,P-.02345789;= ?@B CxDxEGTHHItJ$KMO<QS\UVXY Z[|\l]^_0_`ab<cdheefghijkln,opqpr0stuTvXw<x$y`z{|}~l xH $\TPX880ld0h$8LT8DÄ<hĮ̏Ϝ`Ht@$@`DP l0l,HD      H@(4l@X$!\##$%'x(*, -./0123d5P6h7X9::;<=?@AChDDEGGlI\IJLKKMxNXNOPdQRhSUV|WX\Y`Z[]P^P`a\c deHf`ghij|khklDm4n,ooq<qrstu@vx,xyzd{@|h}t8L|d0 d`T 5777'13#3'17'17#3#17%671167!11!1&'&'@ZZZZ'ZYYYYY3YZ     ::   `  M"4'11&#"132765676'&'@       `js11131716761312##11312##11'&'&771#11'&'&771#1"'&547633171#1"'&54763317167673171# _   : E: E   _   : E: E  __ ;E ;   E ;E ;   E 4~2111230111''1&1211#"'&5510#01#111&'&'&'&76767676'&'&''11101&'&'&'&7676767514763 0  /0 1     1 1   $       ! #       # "/65114'&#"1327&'&767&'&767w @    I @ $$$$$$$$J211171611''11#"'&5511'&'&76771'1&'&76761514763 p  rs  p  o  rr  p  C DE C B EE C 14'11&#"1#1"331132765513127654'&##15      p      @,6711671&'&'57111676751&'&'--DD----DD--))))D----DD----D`)))))&'&17711#1"33327654'&##1`  .@ `` @ @    `@0"1#"'&54771671312#!1&'&77167&'&'" +<>())  "` *)(><+  ""@D47116331131#1"'&''1&76761316767&'&'#1&'&771#1"'&5  :&''&:O   Oh   x'&::&'  x 96'11&'&1331132765513127654'&##1514'&#"1#17       kr  P P   @?67312##1131#1"'&''1&76761316767&'&'#1"'&77! r:&''&:S   S !  p'&::&'   @#>6'11&'&101016767&'&'711#"'&'&54767632  %--DD--*+@?   k  +9D----DB,-K  D471163!11'&'&71#1"'&5       P @"Dc&'11&'#13167674'&'673#3#1&'&'67673101013101015011101#10101&'&'6767310$%6 6%$#$%6@6%$#@   6%$$%65$ 6%$$%6 $5@@81132767654'&'&#"&'11&'67671'&'&77@   XA+*--DD--$ @  -,BD----D7*  K1111'%1&'67%16}   @ n     @@+"113!127654'&#!"113!127654'&#!0 `  ` @     11117%167&'%1&   @ n     0<I6711673111132765514771676551&'&'#132765676'&'P +'  *$%6 6%$  P   "0  !6%$$%6 P]112#&'&'&'6767671&'&'&'6767632113276551&'&'&'&767R6666R H9:"""":9HH9:"")-$36%$$%6+    66R@  66RR66  "":9HH9:"""":9H )!!$%66%$ P   R66$$$$!(&'11767713117676''1#3#71 x(   (x*HH`  LL  ` @/>11113167674'&'67&'&'##3#51313#3#15@6%$$%6`````````$%6#"06%$@, "327632#"'&'&767632#"'I1<<1//1<<1 DVVD,,DVVD 1//1@@1// AA-9999,BB +67116731#1&'&'3#3#1316767&'&'`?2332?`````D----D`32??23@--DD--@511113127654'&##1513127654'&##1513127654'&##@       @-111132765513127654'&##1513127654'&##@        :116767#1"'&54763312&'&'&'676767'&'D----D;++ }  >>Z?2332?X=  ,?`--DD--$#8  X9:32??237  (2%53276551514'&#"1!1514'&#"13276551!@         @1"113311#1"3!127654'&##113127654'&##  ``  ``     @  @*2111&'&'51476321676714763  --DD--  ))  D----D   )) B565114'&#"11514'&#"1132765517117676''177 .   A j / x kC  ˍ @2111312##1"'&514763@       ,617161#"'&511#"''11#"'&5167      $611476321'11#"'&5167    ( = 5"1132767654'&'&#11#"'&'&'6767632+%%%%++%%%%+45;;5445;;54`%&**&%%&**&%=3333==3333=@.67116731#11#"'&55153#36767&'&'#1`D----D`  @```))``--DD--` ))@71167'1&7676167&'&'&'&'&'6767671'&''@--D,#H G--DD--5D?2332??2350 .D--V  U*7D----D"32??2332?V=9  8B+;111132765513117676''16767&'&'##3#5131@  _g T(()=pppppp""   x$#.=)(""Dh013'1111&'&'&'&#&'&767627676'&'&'01&#&'&'&'&71'1676'&'&'711&c 8 :7E    9  8  :7E    9 W   $@     $@  #"1133113276513127654'&##        `  *2111676751476321&'&'514763  $%66%$  66RR66  6%$$%6 R6666R 611116761&'1&767     9   B.6111167116761#&'11"'1&767 nUUn  QQ   $&   16'11&'&1'1&'&117677117676''17y  k     %&'11&113276551716'&'&1':      ז   &471163!11312#!1&'&71#1"'&5 @         L +i5'1"37171331127654'&#1514'&#""111331673123312765&'&'#1'1&##151'111#1"1#` `` `   d!;;!$ @ --D    ``      @ ..  D-- ,, ,j2111712#'1'1##11"'&54763151476347116331716331517111312131##1"'&54'&##1&'#1"'&5563211#"'&551477 ` `` `  `    D-- @ $!;;!d           ,, --D  .. @+ +A8H%11#11!1&'&'51#1&'&547%162151476331211%1316751&'#@    k   5 PP   ^% y. ?PPE-@Sd "13127675131676''67311#1&'567&'&'&'2711654'&#"3'67&'&'f B/0   F@@N4444A   %'&: 00Bp@@044NA44   %:&' %D[}6711671&'&'4767571110016767&'&'010151&'&'671167&'51&'1%#3#14'&#"1#11327716'&'   "" 00 ()==)( 0  P   @ @P  ""p 0%3=)(()=3%0 ` ! 33 ! @  @ @ %D[|6711671&'&'4767571110016767&'&'010151&'&'671167&'51&'13#3676''1&#"131132765   "" 00 ()==)( 0  0  @ @   P  ""p 0%3=)(()=3%0 ` !  ! @ @  )4AMZhu1113167673327654'&##151&'&'!15167"51671&#55671&'71&'51675&'5167676'&'5211#"'&547630  ++x @ @ `Ppp----    **   @ qq '((''(('p   bk~&1&'1&1'1&1'1&1'1&10111111111"3211'1177117712327176''167176''167176''16767176''16'716'&1&'716'''112337211#"'&54763767&'771767176''167176''167176''16767176''101656745614541515111112#"'11145716'&1&'716'&1"#"'1&1'1&1'1&1'1&117717111&#&#11#"'&5476321            000   @             0                P   0               6'&1&'1&1'1&1'1&1'1&10101111111"311'1177117717176''167516751176''167176''16767176''16'716'&1&'71111'7676'&'7&'67 !     '  %     #     44                 $  +  #HY3#331211!1'1'1&54763'#13!67&'#171311!15167673!!!1!1&'&'5]sss  U $/ 00   O `  [@@ @@@@ pp 0  0B)]g5#11311316751316751&'#151&'#167116'&'&1#1&'673327654'&###"1#1"1333277%3#311"101880880P  wy@ @^-#-% ,$88808808   X  $ @ ^^~21116751476321675147632111#1&''1&54763214545147632167514763&#"11113277171654''1'''11#"''1'1&5477171632'11#"''1'1&5477171632@      /@]Cq  <   000000000000  p   &?k  :  00000000  %2l|2711654'&#"32711654'&#"3&'&767545015147677167716'&1'&7716'&111111514'&#"%70716'&7331131716'&&'11&113167&'#1&'673167&'#1&'673167&'#1&'673167&'#11111#171676'  `  .< .  N >  D+  ,   /   ? <''3\  ||    |].        0III'#"7..%O   k uK1 G***2 @/// (  %('.      Aa&176''1&''11'17161131676751&'&'##'1'1&#"1'171&#"1'131176767176767' P  M  *  LH!YR#~wu  l\  0 j {<   /IBc_%%  S 7Odm&176''1&''11'17161151#1'1'1&#"1'171&#"1'%%131176767176767%''#1133127655&'67%5331276551&'#67&'' P  M  H!YR#~w\ 777   0   P  0 j {< /IBc_S ,,,  DW`ir{76711671167311##1111111#11#111#1"'&551&'&'!2711654'&#"367&'7&'6767&''&'67767&'&'6732?I77 * mk P( .`  p(((>32--E5    I=M   xx6]fox%'112121#1'1&76167311##111%671111#11#111#1"'&551&'&'&'67'&'67767&',,, +'  39MI77 * @;>+ "P( .h@(z""" "  (,--E5  f:1" I=M0  ,Xk74711#1"'&551&'&'''6767311#13#311311#1311#1311##15167016372711654'&#"3  .56DI77 * !8   0  ! I=MG:##--E5  @   P   6w76711671167311##11#11##1"'&551&'&'7'&766767676'&76767&'&'&76'&'&'&'&'6767&'32?I77 * @  .        (>32--E5  @  I=M        `PA7DW%6711676''1514'&##1"1'1&#&1311!16767'13%&'&76767116731#1&'  5   j  A $$$$p"@"  /y %^    ""-6X631121#151&'#11311#1&'&'51#1&'&7753151#'471163312131##&'&'67315 @@   І0   0   &@ pِ   _2111&#"514763&'11&51676721"''1&'7'11654'&5456301636767&'&'"'"'4547654''&&'&'&'&76'&'&'67676'&7676767767#&'&'514567676767671&01#"227767&'&'67@  } # & H            HHH & #  qH | |  '&,,,&           E&,,,&'    l 4Ag676'&'67116731111#1&'&'51&'&77%676'&'&'673111#1&'&'5171654''5315167611'&'51#11''1&7716@  & ,+@0      *,     0@` @@ ` @@ $$$$ @/I  t2$$$$ 2t  I/@(  @@   @@ $E%3#36767&'&'#1'1&'#11'1&176''%%1131277131131677IIIte 8( P NA  *+g19 B 0 > nn :r!%?a531513121327654''1&##14'&##1"11131676''1&'&'#531#11&'51#1&'67315167<" "!< @ c    ``` " " x    !%?V531513121327654''1&##14'&##1"11131676''1&'&'#11#"'&'6767632<" "!< @   ``` " " ^gp&#"1767676'4'&''76'&&'&'&'&76'&'&'67676'&767676767&'&'67  /.VV./          HP3EEAB+ +BAEE3Pm         [m471163232765&'&'1#151&'&'#1311#1"33327654'&##151673167&'#11#1555!11!16767   ))@00P  P88@@))`  ))    )) ,]s676'&'676'&'74'11&#"32765#1&'&'676731&'#11!1676751&'&'11316767&'&'#  p$$$$`   )))X))@)) `    + )))&))))`7N\"1133116767&'71654'&#"1&'513127654'&##111&'&'51676756751&''"1'&771671131#1&'5147716551&' L11;;XX;;  +9 `p   t  %' ,@'   "88PX;;;;X@1 # "  ``4```  `  ",  , /=X_&176''151#11'151#11'1!127654''1&'!11'3#3'113#3#51#11131676751'1111111' P 7@@+F Lt#UUUe @  @ 0 +ʘd4"  r O  P  A3$5Q]&176''1515111#"'1'1676727676''1&#!1"1'''#151#"'11&'11!127''327' P W  ())*:8ܕ@jjj! 0 Dd %%%[ $,vvv@ SSS'?R&176''16767&'&''165&767!1'%%31276767711&'&54767' P n&)); "&9H,        0 V55MR6666RK5.&,243'0-L55  A1EUb&176''13167&'&'#1"'167&'&''167&'&''11310101&''1#11!167'1#7676'&'' P .*)0)"+'D. I8&&J@---- 0 . ."#)$  "".+9&&8'((''(('4'11&#"1''1&#"1#1"3311327716132765516761327654''1&7673127654'&##1&'&771654'&#"1'&'5676'&'&'67     &   &        '   '   p  &        &   '        &   8IS&176''1&7673127654'&##1&'&771654'&#"1'&'514'&#"1''1&#"'63'%%#1"3311327716132765516767' P    '       `  E   &      0 y     &   &  K 7      '   `i|17716131#11''1&1&'51&'&1'&7716'&'#1&'6731676''1&761767516767&''4'11&#"327651176'&&'&'&'&76'&'&'67676'&76767674'11&#"32765              00   @                         @  P        p  jx7''6711316767514''1&5515151&'&'#10101"101&'&'&'01"10101#1111113127&551477'''1&767761'&7888//F  0  0   000 0 000 0 ӧ   H J  J H   "x000 0 0000 0 kx'11##1&'&'5147716551515167673101010301676767012101033111111#1&'&'514771&'676'&''11771176''1716'&1'1&513367&'#151&'888   0  0 F//7        z"   H J  J H   ~      @`9%"113312765514'&#"1'1&#"1'1&#"1327711#   i iS`   S j j @`9"'11&547633121#"'&5511#"''11#"'&54771632171#   i iS   S j j)W "132771132765511327654''4'11&#"1!16767514'&#"1#!1"'&55 I  I  ))    J J  @))@ @ @U\e&'1#1"3311#1"3311767713117676''13127654'&##1'13127654'&##1'#3#713#31#17 H[ @ 3     3 @ [G@@@ [vvv    4  LL  4   MM@ @>GS\k"111#1"1111331132765513167674'&'67&'&'514'&#5#1513555#15135531# J F  0  0  00@  @00@      z*v    0%0   ````````  @````````  @Yhy4711632131514763211#"'&551#11#"'&551#1"'&55151515147633153#36767&'&'#1#3#1316767&'&'#0   # 0     ppp  ppppp        '%0      v*z   `@`  +7776731213121##1"'&54771#1"'&5 .   /  {    5F6711673117711767513321#12##!&'&'113!151!1")` 66     )@  `) ++  @  )@ @ @@%Gi7#11!167671&'&'#1'1&'#1#1&'4771&#"1'&771677163673113277161&'1#&'5 KK "z" M #21$ M #21$  "" M@ "" M a;G4'11&#"11327655167676'&'&517676'&'&'55&'&'6767  F,--,F  /$    $/@** # 34II43 # #  #d "!..!"  7Mdz2111!12#!1&'&'147632111#"'&551476375#"'&551476322111#"'&551476375#"'&55147632   p"      @        "P @ @ @   ` ` `   7Mc2111!12#!1&'&'14763471163312##1"'&53#32##1"'&547633#32##1"'&54763   p" ` ` ` `  @@@ @    "P `  @   `   %5F#3#11317171"#554'13'#3#1131717#111317171#!!!1!167675VVV\@hv\\\\F@@@h@&#11#''1&##111312771621127716136767514''1&747636133167654''1&771654'&'#1"1'"'&5&7716551&'&'"1''          3<py''1&547716131676751&'&567671#1&'67%67611'&'51#11&'&'476751676731567&'@  PP   "" $%6  PP   "" $%6( H H ( "" 6%$(8 H H ( "" 6%$(h]fo67&'7111331276551&'&567671#11&'&'476751#1&'&'51&'&5676767&'&'67PP    "" )0 "" 0) ""xX ' ' "" ')G "" G)' ""4=clu1311&'&'476751&'&'#11''1&547716&'675&'&'476751&'&56767&'6767&'2 6%$ ""   PP  ""  "" H($%6 "" ( H H NI "" ""  bU_i6'11&'&117677117677167676'&'&71676'&'0#&'716'&'&1&'77&'4767771&'   B)*      2'  6     \... ===>   -33F,%&G  4  *   <  0g(% R76711677676'&'&'67676'&'&515167217676'&''1&#"&#"111&'&'`--D?,  =X?2332?X=  ,?    +D--(  732??237  (`   7 S&'2@5>111311#1"3!127654'&##1'13167671&'&'!!11!@ E  E @@    @  6CY"11#1"3311&#272765515127654''&#676'&'"113!127654'&#!    #6%$$%6%     ` @    1$%66%$ `   $$$$   +8Rly731276''1&111!167671&'&'!&'&767671167311##1"'&553671167311##1"'&557676'&'77716'&'#1"@@@ @ E`  P @  `  @  ` 5 @ @@@@  @ {`         @  @@7W67!11&''1&551'1&7211#"'&'&54767636'&1'1&11771176''17  k=''@  '!!!!''!!!!'; %% $$ %% $$ //A)$0 O""&&""""&&""k $$ %% $$ %%E"111#1"3311#1"3312767713127654'&##171673127654'&##; 7k P- % % 7k P- % %  l    l  )!!!&'&'51!11!!!516767311331@   @@ @I"1111#1"331132765513127654'&##1513127654'&##1513127654'&##P    P P   `  @ @  @  `  :FP"1111327655167674'&##151327654'&'514'&#5&'&'67675531 F,--,F  F,- " *<  **@\ " # 34II43 # # 34I \  ) # "!..!" \\\" @AM[&'1!1"13311331677131276771312771312765514'&##15#3#71311#'!!!!1&'67@   ( `h C \\\i p   h K  P @; `{5&'5167'''1&766176751476321'&''1&76176''1&76176''1&76176''1&767655167514763211'&7716Pc   f|   %166)d5 ]] uu ]*%)%  %   @@@@000  0  `| ' +%$'d5 ]] uu ]**0b( +%$ 0  0 A(5G%11#11!1&'&'51#1&'&547%1621'&'&767113167&'&'#@       `""@     $$$$`""@P471163332##1312##11''1&767312767#1"'&5476331&'&###"'&5 @ 8# $ !!.  P   @     ,g     I67116'&'&1514'&#"1#1"3311327655117676'&''13127654'&##17U        h  z    z   j211163251476321'&'&'1#"'&551&#"1#"'&551312###"'&5476331&'6767514763   *   #    .$%6  /2  !! 1#$. -D __ D%?6%$   5K;..1 94'11&#"1177113!127654'&##15171676'&'&15  )      w     ' "B"111132765516767132765113276551&'&'514'&# F,-  *  *  -,F  # 34I .!"   "!. I43 # ,>P]kx"1###116771676751&'&'##"''1&#''&'&55167311%76751311%6731#1&'3#3#1&'676731#1&'@*"% X)l5DD5l)H&"*(##(U* #" *UU0E55E0U0P]6'11&'&1&'"&'"113276551676711767712765517163213276551&'&'7. "  0     N  $   +  _!  P   +  < d -6#-7ANf5!1676751&'&'!111#157115135#16767'3#31&'&'676'&''&'1!167&'!1&'&'5``@@@@`@@@@@'((''(('""3p`@@@@@@p----X3""CJQ&1#1"33113276551311767513127654'&##1514'&#"1#1'3#31''#3#51{    da    9w::::      @VV 5777'13#3'17'17#3#17%671167!11!1&'&'@ZZZZ'ZYYYYY3YZ     ::   `  .A^"1113276767327671&'&#"&'&'&#4711632#"'&5!21'&''&77163217163.  EFllFE    EFllFE 2    | FccF  E W    d         W ! 5AL"111"31132765513167673127654'&##1&'&'##3#51313#3#15@    `;++   ++;ۻ`   ` `  ` `$#8  8#$@@@OYdl"111"31"31132765513167673127654'&##1654'3127654'&##1&'&'##3#51313#3#15#1513@     P4))  ))4pP//P @   @` @+    +` @ ` A671167111''1111"#'11"#&'514771511'&55147715: nn :bBw 99P+*   *+P99 wB+:Zj471163311'&''1#11#"'&55153#36767&'&'#1%3#3#11#"'&551514763671167&'&'#113 P=)('4 8*  @000""0PPP0  00  P  00 ()=-#"   ""` 00 `    `@E471163312##11##11##11##1"'&547633151476331514763315  ` ` `  ` ` `  ` ` `  ` ` ``ir&'67671165&'&'1#1"3!1167674'&'51!127654'&##1516765&'&'1!15%67&'&'67  "" @  ""  @ "" Hxa "" 7  7 "" 7  7 "" 77I1?Re671167!111##1"'&551!11##1"'&551&'7!1'1&'#14'11&#"327652711654'&#"3"`"            p"")0   0) HHHHH     b211171611716113167675167631#1"'&5511'&'&76771511'&'&76771514763` w  w  @4$$  66N`   )  )  #" '" '""5  N33     6 @)6Qg111311317131131713167671&'&'!676'&'5211#"'&'&54767635&'51&'6767@@@@----+%%%%++%%%%+   `'((''(('%&**&%%&**&%ssss !  !   :Cc7113277171654''1'1&#"1113271654''1&#"7'171113277171654''1'1&#"1113277171654''1'1&#"1&&&&&&#}#iiii#8998`8998&&&&#}#8iiii"99889988 6'&177'&111&''1&111&''1&111327711327716''1&'711327716''1&'711327716''1&'716'&1&6'716'&1&''XX      E E '& ", &' ", &' .;  :. XX '& *! &' *! &' D E  !  !  .< !!:.  Lg676'&'&1'&'&76771611311'&'&771#1&'&'6767271'271167654'&'&#"3@s )  )&,Z&b  F --DD----D7*-    I + + z"D----DD--6   _&1111#1"331131676751&'&'#1"33121#1"'&5513127654'&##151&'&''$     ) R66)  $%6    %    )66R )   6%$   &  (GTao|6731#1&'3#3#1&'673#3#1&'67471163!121#1&''1&'&'76731#1&'#6731#1&''3#3#1&'676731#1&''3#3#1&'676731#1&''3#3#1&'67'3#3#1&'678  00`x`0Hk  6))))6S`````H` P&'&767&'511'&'&7716763332311###1#"'&551##1#"'&55  H :-" (    7  a'!$  ` `` aAk%6711676''1514'&##1"1'1&#&1311011331232323332765515147633121133323233127655147'13  5   j    @ !    /y %^  Ep @ @ A=%6711676''1&#&131131'1&771'1&76111316767'13   f U< v Q&{     4 GS ] C@A'O%6711676''1&#&1311!16767'13%67311311#11#1&'51#1&'5167315   A  00 00    P0 00 0 aB2111'&'6761#"'&551&'&'6767514763 /$  !,6%$$%6,!  $/  F,--,F  # $%66%$ # # 34II43 # 1H4'11&#"1#1"331132765513127654'&##15113!127654'&#!1"  p p  p p @   p  p p  p@  = 46761##1&'1#1"'&7716&7!11!1&'&''  ,    "!,,!"    @Q  **x6767676'&'&'&'&"3001111'&'&'11&'&#&23311317676'&'676'&'&'&'#1&'&'&7&11101#1&'&'&76761A(  6,/  " ))   5,/   ) M) ( # `   6 *     4 &      %6>JZc11313151##"'&54763!167&'!3151'1&167'17674'1#3#131271&'&'67&'@//E8 pH@ 7)Vy&}[ ++8D--  XH "#F@/@W$ ]0@`21111''1&##1111#"'&551&''1&'&767613676751&''1&'&56767514763471163311'&''1#11#"'&55153#36767&'&'#1   !4"#     4"$ p P=)('4 8*  @000""0  #%'     #%(  @ ()=-#"   ""3M671167311#1&'&'671167311#1&'&'5%3#31#1&'&'16767            p      p    `         1l11#11311''1&7673151#1&'&'516767!155#131676'311!1&'&'5167673131#11311327713. FF .@S GG S @ FF @@@@@@@@@"V%55!11!!!!&'&'516767!1111#1&'&'516767331311''1&7673151&'#1"& FF &P @@@@@@@@@" FF @"V%55&'&'!11!1676755331#355311#117716'&'#151&'&'##1316767@P& FF &" @@@@@@@@@@@ FF "@Vly671167654'&'&''''&1'&''1&767716771671771632111#"''1&'7'#1"''1&7677166731#1&'7'''1&767'&7716F::$""$::FF::$""$::F/'''  #       A  +  '  @!"<=CC=<"!!"<=CC=<"!         P 3;_x&176''1653127654'&##1&'6771654'&#"1&##1"'''167%#1"33113277151'7111331276551&'&'' P @ @ @ @p ___8'@ @@ ?%5) ) 0 x  @ @ RJJJv&  % @ ?!m)  )@#*Ee6711673113311#!1&'&'#3#51211#"'&'&5476763&'1#131167513167&'#15 8$#"0'!!!!''!!!!'0000 '.->-%%@`""&&""""&&""P0000<Mq!!!6767654''1&'!113#3#1#151#111316767515152111#15147635"13312765514'3&'&'%c// LtL [@@@@   @ P  ""  rr  P  P  00 000   0""6731#1171'1&761''113151671&'51#117161'&771'1131#1&'673151&'11''1&76171&'#11&'516713167'11'&7716116751#1&'&'&76767&'P/# 8 "" 8 $.P/# 8 "" 8 $.0@" 8 $.P/# 8 "" 8 #/P/# 8 "  hU&176''1673116751&'1#1&'71176''1&11&'513167&'#1311'1716'&1'''#151&'16751311'1&176''1711#13167&'#15167' P "" 8 #/P/# !_j"" 8 $.P 0 |#P/# 8 "" !Ki P/# 8 ""d11#"'&54763267&'&'#1"3311#1&'&'51176''1&177113327&'#151513127654'&##4'11&'&#"3276765'1''1&761716@   ))))   0)88--DPP "   +""&&""""&&""M H ( = `  P4))4  )88D--%P  '!!!!''!!!!'+ H ( < d11#"'&54763267&'&'#1"3311#1&'&'51176''1&177113327&'#151513127654'&##271167654'&'&#"35&'6751&'5167@   ))))   0)88--DPP "   '!!!!''!!!!'`  P4))4  )88D--%P  ""&&""""&&""`PPd11#"'&54763267&'&'#1"3311#1&'&'51176''1&177113327&'#151513127654'&##271167654'&'&#"3771''11'&771'1&761716@   ))))   0)88--DPP "   '!!!!''!!!!';$$$$ %% $$ %% `  P4))4  )88D--%P  ""&&""""&&""%%%% $$ %% $$ fw11#"'&54763267&'&'#1"3311#1&'&'51176''1&177113327&551##1513127654'&##2111#15147635"13312765514'3&'&'@   ))))   0)88--DPP 0    @ P  ""`  P4))4  )88D-- !  @ 00 000   0""@Yhw3112771654'&#"151!127654'&##1511327654''1&#"1327711##"3311'1&#"3#3514'&#"#3#1327655 ` )` `) ` ` ) `) ` @@@  @@@@  7 ` *s  s* ` ` *s  s* `7  Uds77654'&#"151!15147#1511327654''1&#"1327711##"3311'1&#"1327554'&#"1353276551#72111#15147635"13312765514'3&'&'``` ) K) ` ` ) @) `  @  @ @ P  ""7``` *ss* ` ` *s  s* ` 7  P 00 000   0""+=M_o6711673113151671311##&'&'5316751&'#11316751&'#5316751&'#171316751&'#5316751&'#1%'1#"'&54771#1"'&5476331'1&547632  ` (  ` @          PPP P s s   HH     P  p    p  PPP P    B*av%271165511327654''1&#"13277113&'11&7676767677676'&'&'&11&'&'#3#1676763635&'11&'#11116765   P P  #+*#  &,21  12-&  #**#N    `  P P  F          0   Ba111#116767636367632327626551&'&'#1511327654''1&#"1327711#151&'&'#&&'11&7676767677676'&'&'&11&'p  ! 0 P P  #+*#  &,21  12-&  #**#  `       `  P P  Z        F)6CP]jw"11331132771132765514'&##&'&767&'&767676'&'&'&7673&'&767%676'&'&'&767676'&'%&'&767'676'&' 3  0  0  0  0    3  P    P    PP  0  P@?j%!!!"3!127654'򺲺'&#"1514'&#"1'1&#"13277% "1514'&#"1'1&#"132771654'    )  ) ` ` )  ) ` `   * * ` `. * * ` `  v'4A1'1&17716'&151&'&'&767&'&767676'&''76''167711331276551117711331276551176''1&'&##1"'1&'&##1"1&##1"1771133127655'7716'&151&'1'1&@@8    $ 0 $   0   & "  " &   0 @@@@v@@v  `  (j111 D16 61D 1& &1 G ? ? G 1& &!@@@@vvUk2111#"'&51476311131'1&54763211#"'&54771#11#"''1&54771632%#"'&5147632    ** ` ` ** ` `      @ I )) ` ` )) ` ` )@ @  :Xu13167514'&1&'"163'76751&'#1"131&567#3#'1&131276''1674'&'716'&'#117712751#;*  p "=V|!!! p "5A#ZAAA#! p "5;*  p "=V`#! p "5A;  p "=V;*E;*  p "=V#! p "5A[#11"'&547716321#"''11312##1&'&'&'&'#11#"''1&54771632131251 ` ` )@ @6%$s* ` ` *s#)) ` ` *  $%6) ` ` )*0=n6311215147632111##1"'&5476331'1&547676'&'#3#"'&547633111112111#"'&5511#"'&547747116321716321312##1"'11&'&511115'#"''11#"'&5511101014767630111312## i  ` j    `   i j-  i j ` mjjj i   `  j `  i $$$$`  ` j i j i  `iii j `  "Df2111311#"''1&76731514763776321#11#"'&551#1&'&7'3#35167611'&'51#1"'&54763&511477161312##11'''211#"'&54763  @ @ W@@@ @     @ @  ) @   @I    @ @  w@@@ @     @ @  7 @    @7   ;Hb}6151671#1&'6731'1&76711671167&'&'&'&7676'&'6131#1&'516717&771#1&'67311&'511'!''1&'516731#11'?`&?w %%11%%  %%11%% $$$$?&`??&`?@???`&??&`?  L  1?`&??`&????&`?6m6311211#"'&54771#11#"'&551676731'1&5476311211#"'&54771#1"1#"'&551676731'1&547) ` ` *  $%6* ` ` ` *  )*  ` ` )   6%$) ` ` )    )) 5kx631121311#"'&5514'&##11#"''1&5477'1#"'&54771#1"1#"'&551676731'1&547632676'&'%&'&767 )   P PPPP P   ) y  $$$$ )     P PPPP P     ) g$$$$  @?j!!!27654'&#!1"31132771132765511327654''1&#"3112771132765511327654''1&#"1    )  ) ` `@ )  ) ` ` `   * * ` `. * * ` ` J"1116767&'14'&#111!167671&'&'#1"1&'&'514'&##      P )) P %%        ))   7L11316767514'&'&'516767&'#11111#11111#"'11&'67676#`p@   A !! A        >KW3#31#151676771633121#1&'&'67&'67&'67&'3167&'#13167&'#xPPPXL@````((  Hp,K67116703036767267632632121!1&5471163!121#1&''1&'&'      00   [  6))))6#>N_k671167!11#165516751&'&'#156''1&17711675117%67!11!1&'55#!1"'&551!3167&'#     p; @ @ %% ``  @``  `  !  P @ @ $yy$   P @@OXaj"113311#11133127655167671331276551676751#1513127654'&#!5#1513#5#1513#5#1513  (H)   ))   )H( PPPPPP  @)@ @))@ @)@  @@@@@@@@@@@@@ AJS\w"113311#11133127655167672676751#1513127654'&#!5#1513#5#1513#5#15134'11&'&#"3276765'1''1&761716@ (H)   ) ))5A/H( PPPPPP""&&""""&&""M H ( =   @)@ @),'H@  @@@@@@@@@@@@@'!!!!''!!!!'+ H ( <  AJS\w"113311#11133127655167672676751#1513127654'&#!5#1513#5#1513#5#1513271167654'&'&#"35&'6751&'5167@ (H)   ) ))5A/H( PPPPPP'!!!!''!!!!'  @)@ @),'H@  @@@@@@@@@@@@@`""&&""""&&""`PP AJS\w"113311#11133127655167672676751#1513127654'&#!5#1513#5#1513#5#1513271167654'&'&#"3771''11'&771'1&761716@ (H)   ) ))5A/H( PPPPPP'!!!!''!!!!';$$$$ %% $$ %%   @)@ @),'H@  @@@@@@@@@@@@@`""&&""""&&""%%%% $$ %% $$  BKT]n471163!12##11#11&'1##1"'&551&'&'513151#1"'&553151#55#113'53151#"11131514'&#671167121##1"'&55147635  (0  ,)   )H( xPP0PPPPx @ P""    @ 0 )@ @)@  @@@@@@@@@@@@@@ 00 ""0   0B=t471163!121#1"115151&'&'11&'3&'&'"'&5567116'&'&'&'&''&'&76767611676   )) 3#**#  &-21  12,&  #*+#` $ } )) } $       !H5#1516767311#151&'&'#1471163!12##11##1"'&''1#1"'&5`0+*A0A*+0,0,`     (A*++*A,,H    CU776'&1'1&1#1'1&13111177171671176''1&''1513167716'&1#1&'776'&1714'"1'1716'&111'1&177117117716''17117716'&1'16'!!!  " &&&& LBBB 4  % #  "     UIII :: I ( 8((8 ( /// %?P  '   - $ & 5    +;M]o671167!11#151&'&'1#1&'&'1316751&'#5316751&'#171316751&'#'5316751&'#171316751&'#5316751&'#1471167632#"'&'&571#13117716''1&   3`  ` P  P  p    p  P  `""&&""""&&"" YY 8 8   ##)L2P  P       p      '!!!!''!!!!'C  8 8 +;M]o1113151676713167&'476751&'&'!67311#1&'573#31#1&'516767311#1&'5'3#31#1&'516767311#1&'573#31#1&'51674'11&'&#"3276765'1''1&7617160  `  `3   p  P    P  p  p""&&""""&&""M H ( =  ` P  P2L)##             '!!!!''!!!!'+ H ( < +;M]o1113151676713167&'476751&'&'!67311#1&'573#31#1&'516767311#1&'5'3#31#1&'516767311#1&'573#31#1&'5167271167654'&'&#"35&'6751&'51670  `  `3   p  P    P  p  '!!!!''!!!!' ` P  P2L)##             `""&&""""&&""`PP +;M]o1113151676713167&'476751&'&'!67311#1&'573#31#1&'516767311#1&'5'3#31#1&'516767311#1&'573#31#1&'5167271167654'&'&#"3771''11'&771'1&7617160  `  `3   p  P    P  p  '!!!!''!!!!';$$$$ %% $$ %%  ` P  P2L)##             `""&&""""&&""%%%% $$ %% $$ '7IYk{1113151676713167671&'&'!67311#1&'573#31#1&'516767311#1&'5'3#31#1&'516767311#1&'573#31#1&'51677"111311316751&'#14'�  `  `    p  P    P  p   @  ` P  P              `  @ @-=O_q11131516767131&55167516751&'&'!67311#1&'573#31#1&'516767311#1&'5'3#31#1&'516767311#1&'573#31#1&'51672111#15147635"13312765514'3&'&'0  `  Y    p  P    P  p   @ P  "" ` P  P%/              00 000   0""'7IYy1113151676713167671&'&'!67311#1&'573#31#1&'516767311#1&'5'3#3#113151671#1&'516716751&'6711671&'&'5''51671''11&'516760  `  `    p  P  X000  0    ### #  ` P  P        @X         )444+`  4+`  A9I[m}671167!111##1110##151&'&'1#1&'&'1316751&'#5316751&'#1'5316751&'#171316751&'#5316751&'#161'&'&'&7677''16767   *& 7 `  ` P  P  `  p  P   x 6 6 xh___2   -88,P  P           r0!))&&&&))!0V&&&*)('7IYw1113151676713167671&'&'!67311#1&'573#31#1&'516767311#1&'5''51671''11&'5167656751671&'&'51670  `  `    p  P  ### # }   ` P  P        444+`  4+`  @@@@@  @ +;M]o11131516767131&547675151&'&'!67311#1&'573#31#1&'516767311#1&'5'3#31#1&'516767311#1&'573#31#1&'5167&'&767113312765&'&'#10  `  Z    p  P    P  p  0'((''(('  'f' ` P  P$`             ---- '''7IYk{671167!11#151&'&'1#1&'&'1316751&'#5316751&'#171316751&'#'5316751&'#171316751&'#5316751&'#15#1516767311#15167673111#1516767315#1&'&'51315#3#&'&'513155#1&'&'513171&'51675&'5167'1&'5167    `  ` P  P  p    p  P  """"""""""""`  ` P  P       p      P""""p""@""`""""hh@    ?&111177116771176''17167&''1716'&1'1&'1'& pcg5 e!!e 5gj G"   !e 5gg5 e!"G jcp S\er&'16753#31#17167'7111331276551!113312765515151&''1&'&##1"&'6767&'176''1&!77716'&^  K       000000PP 55  OOO%(@     @(%OI000000:FT]f1111131&551677167633121131676751&'&'&'&551#113'731'1&##1"67&'7&'67H9:""+ t +"":9Hk ֬t"":9H p!@ @!p H9:"" (( ****  F676'&'55311327655117676''1&'#1176771132765#3#11"13311316''1316751&'#151716751&'#11151&'51&'$$$$   44 44     <,05 @     R,,R   d   `\ T8m tr Ta&'&76755#1"'&7711'&'&771671'&''11##11#"'&551#11#"'&5&'&7675#"'&5511'&'&77167311'&''11#"'&551#$$$$H :%::%;     $$$$   44 44      PPP]%  N..N  %]P PP   ```   R,,R   `+7671167&'&'1&'2716767&'765711'"!"""""!%% ""!J"" ""+J J$7at11#11!167671&'&'#1&'&'211#"'&54763671163311&'51477165&'#1"1'&754711632#"'&5  &%    V:  ,: 6   @@    $     B$2?MZ2116731!1&'&'676767677'&7716%1'&77167'&771671'&771667116'&'&'&'&''&'&76767611676 ")S000  0  G 0  0 000  0  g 0  0 1#**#  &-21  12,&  #*+#)PPP P ! P P !PPP P ! P P        >Xfs5!151!%111311#1"3!127654'&##1'131676751&'&'!!1113167671&'&'#3#3#1&'676731#1&'211#"'&54763@u K  K u  @  @       `@      ` @P   3Mg53312765514'&##1"111771676''1&'&7"1113312765514'&##"1113312765514'&##53312765514'&##1"'"1113312765514'&## @ @ m   7   7 @ @@ @ @ @ @  @ @@@@ @  7   7   @ @ @ @ @@@ @  @ @ 1L_11177167677167&'&'!#11"''11!1&'47%4'11&'&#"3276765'1''1&7617160 :'&3 `('Z""&&""""&&""M H ( =   +.   /A '!!!!''!!!!'+ H ( < @;Xe617161#1&'&#"#1'1&76167'1&761632371671111!111312#!1"'&5476331&'5167 a WG   PL a?f  L     7W4 h XK   00BKT3#32311!1'1&767314763!!!211#1&'&#"#1&'&'01'1&55147635!151!67116'&'&'&'&''&'&76767611676 K  K  33  @#**#  &-21  12,&  #*+#    |H H| @````       @#*EN[6711673113311#!1&'&'#3#51211#"'&'&547676367&'516751&' 8$#"0'!!!!''!!!!' '.->-%%@`""&&""""&&""PP@#*ER6711673113311#!1&'&'#3#51471167632#"'&'&53&'#13167 8$#"`""&&""""&&"" '.->-%%@'!!!!''!!!!'@#*ENz6711673113311#!1&'&'#3#51211#"'&'&547676367&''56751673111675171674'&'#1 8$#"0'!!!!''!!!!'@ (   (  '.->-%%@`""&&""""&&""      A#*BL67116731133111#!1&'&'#3#5161'&'&'&7677''16767 ]!7 ' x 6 6 xh___2 /%%-::/@b0!))&&&&))!0V&&&*)($9w77632&'&'6767630101&'11&'&32767471163312#1!151"'&54763312121#!1"'&551476352711654'&#"374'11&#"327652711654'&#"3Z --DE-,"!&  &                  **.D----D9/0   0  @@  ` @ @ `        D9L&1'1&117711771676767676'&'&'&'&''4711632#"'&5 ] .. ] N)#"  "#)Nm    17 PP 71 ;;  (Sd7#&'&'1"'&54763332#153151#%3#32#11!1&'&'477151"'&5476335131'1&551#) @ 1O@@ v  v  01@;)   PF````@    @ OO ("131676716'&#!''3111'&''  !! )!! l   ]]]]  (="131676716'&#!''3111'&''7&'11&'&6767  !! 3   l   f *U67116'&'&&#7676723676745677&11237676'&'65&'&#"&'&'11&277676'&'&'45&'&'"#&'6'11&'&"#767367674'67%47176751&'#1"176'&'7'1&131276''167&'&'&  !              !          <  !]! =  x   !   =    !   !          !H=  ,! ';'=  -! B4>s}7&7116771633321##11###"'&547633367&'#11'&'%11131010#111###"'&5514763317163332###31716111#10103  $- %-#-NP @yw v  $- %-#-NP @yw  ] @ $  X  0 ^ @ $  X  0%Pk4711632#"'&5211#"'&54763211311&'&'6767&55167314763271167654'&'&#"374'67&551673147632311&'&'6534'11&'&#"3276765211#"'&54763211#"'&54763   0    +--DD--,   5  +--D/%&     P       P ''2D----D2''   `'"3 ''2D--'"'  `   0    `u4'11&#"111111#13!67&'#1716551515151514'&#"111'&7716'&'&111#151514''1&'&1''15155315131131513167&'#!3`  V `V  E   /@/   E@@    @;$cc$;@ @1\  #   4&> >&4   #  \1@@  3x&'&767'"''1#11'&7711'&7716321''%21111117676''1'1&547632111111#1"''1&'5151514763!2111111##1&'&'51677111717163211771655151514763@  -   &&  3     Cd 0 dC    3 YYY##Y  d (P(3   !.O d'f@8 8@f'd O.!   3(P( _211#"'&'&547676321111117676''1'1&547632111111#1"''1&'5151514763!2111111##1&'&'51677111717163211771655151514763@#### 3     Cd 0 dC    3 """"@ (P(3   !.O d'f@8 8@f'd O.!   3(P( @-He7'32771&'676726551&'&'&1'1&'&1271167654'&'&#"3713121'&771#1"'&77160  21K+$!!4#!   !#4!!/'!!!!''!!!!'0$`$` +8K12 6&'     '&6A,""&&""""&&"" 6H6H@-H[7'32771&'676726551&'&'&1'1&'&14'11&'&#"3276765'1''1&7617160  21K+$!!4#!   !#4!!/""&&""""&&""M H ( = +8K12 6&'     '&6A,D'!!!!''!!!!'+ H ( < @-HQ^7'32771&'676726551&'&'&1'1&'&1271167654'&'&#"35&'6751&'51670  21K+$!!4#!   !#4!!/'!!!!''!!!!' +8K12 6&'     '&6A,""&&""""&&""`PP@-HU7'32771&'676726551&'&'&1'1&'&14'11&'&#"3276765##1&'67310  21K+$!!4#!   !#4!!/""&&""""&&""@ +8K12 6&'     '&6A,D'!!!!''!!!!'@-Hj7'32771&'676726551&'&'&1'1&'&1271167654'&'&#"37531#11&'51#1&'673151670  21K+$!!4#!   !#4!!/'!!!!''!!!!'0000 +8K12 6&'     '&6A,""&&""""&&""000000@-Hj7'32771&'676726551&'&'&1'1&'&1271167654'&'&#"3771''11'&771'1&7617160  21K+$!!4#!   !#4!!/'!!!!''!!!!';$$$$ %% $$ %% +8K12 6&'     '&6A,""&&""""&&""%%%% $$ %% $$  )7i%3#3&'&'1#3#16767!1151&'&'#53#367675174'11&#"1327655131132765514'&#"1#15AAA = l '';M]m111163311#1131676751&'&'#151&'1#151&'&'#3#31#1&'516767311#1&'567311#1&'53#31#1&'5167%'#11'177&'1!1676'P G Iz  ( `        <<<=0J  {  \w z""  HH @  p  `  P  ccc@)z,: ,676'&'!!!67674''1&#"1'1&'10----E   0~   '((''((' OBYb&'11&111'1&'1151&'1#1"3!127654'&##1'111#17111#151%11771676''77311# ! l  C>BK5)Q !* p   ['#'   NKX^  !}  1Q^fsz676'&'571##1"'&551&'&56767315567&'67311##1"'&5676'&'5654'%&'&7675175654'111##1"'&551&'&5676731H. @  0 %.% 0  @ x$$$$P@ @  0 0 h   T2*B4' "0 '4B* 0" H   TTT  T*TTT*"+ +"0  0 /<&'&767676'&'"113!127654'&#!%676'&''76''167711331276551117711331276551176''1&'&##1"'1&'&##1"1&##1"1771133127655h  p @     $ 0 $   0   & "  " &   0 x     j111 D16 61D 1& &1 G ? ? G 1& &C 676'&'11132717676''13117676'11230176767410171677103271117676''1&''171117676'&''1'1&'&#"1'1&##%676'&'71327716771'1&'P      9t  G 2   "#&5  r< =(`   {  6 @!NX  \ 6A  %"< >>>; > $-2?LY11&'&''1&'&11327655131132765167716'&'&676'&'!676'&'1111132765513113276551133127654'&##1'1&'#     ;    ;    X        0 &+!#  #D  2D#  #% `    ;$(5B%'%11'&'&767%16&'&767&'&767676'&'''1##1"'&5511'&77167633127167633121633121''11##1"'&5511'&771&''11##1"'&55111'P    !    8 0   & "  " &   0   $ 0 $    `(  111& &1 G ? ? G 1& &1 D16 61D  R|676'&'55311###3#"33!27654'&#!15117676''1&'&##1"1767715'1&#"132771654'&#"1514'&#"  @XXX x  :  : X P P   `````   /  a a  / P P   R|676'&'55311###3#"33!27654'&#!15117676''1&'&##1"176771''&#"132771132765511327654'  @XXX x  :  : PPP P    `````   /  a a  /GPPP P    Vc&'&7677'&'&7#1&'514'&#"11''1"'01&'&'&7477167633121'&'&767----??? <(  f  C $L#3 u'((''(('OOO  -% 03  P eG  3   J676'&'55311327655117676''1&'&##1"176771132765&#"1'1&1111771176''17171'1716'&1'     :  :    L (B  N ;; 28( L` /  a a  /  J E-  P 66 O)&E J Gc&'&767'7676''1&'#1"176771132765513113276556716751&'&'1675/// J-$ :     X  999  Y" a  0  pp l676'&'553113276513327654'&##151311#151#1131676751&'&'#11##"176771132765    8P @    MB :   `   @ 0    P a  0 @ E`s676'&'5#"'&5511'&'&77167633121&''11#"'&551#471167632#"'&'&57&1'1&17716'p(   :  -   ""&&""""&&"" = ( H   Ѐ 0  a J#/ '!!!!''!!!!'+ < ( H @ E`iv676'&'5#"'&5511'&'&77167633121&''11#"'&551#%211#"'&'&547676367&'516751&'p(   :  -   '!!!!''!!!!'  Ѐ 0  a J#/ ""&&""""&&""PP@ E`m676'&'5#"'&5511'&'&77167633121&''11#"'&551#471167632#"'&'&53&'#13167p(   :  -   ""&&""""&&""  Ѐ 0  a J#/ '!!!!''!!!!'@ E`676'&'5#"'&5511'&'&77167633121&''11#"'&551#%211#"'&'&5476763&'1#131167513167&'#15p(   :  -   '!!!!''!!!!'0000  Ѐ 0  a J#/ ""&&""""&&""P0000@ E`i676'&'5#"'&5511'&'&77167633121&''11#"'&551#%211#"'&'&547676367&''56751673111675171674'&'#1p(   :  -   '!!!!''!!!!'@ (   (   Ѐ 0  a J#/ ""&&""""&&""      @ E`676'&'5#"'&5511'&'&77167633121&''11#"'&551#%211#"'&'&54767636'&1'1&11771176''17p(   :  -   '!!!!''!!!!'; %% $$ %% $$  Ѐ 0  a J#/ ""&&""""&&""k $$ %% $$ %% Z&'&7673#313276551311327655131276''117676''1&'&##1"17677113&#"1'1&1111771176''17171'1716'&1'    &" 5 5 "& L (B  N ;; 27' L  ` `` `s8  YY  8sn J E-  P 66 O)&E JB3@w4'11&#"1167632716771676'&'&1'&'&'5676'&'&&'11&7676767677676'&'&'&11&'   !i  i?=&$$$$ #+*#  &,21  12-&  #**#  )$# a   (          :JW211111311'&''1##1'&''11#"'&55167676765514763&'&767  !9W, &`\   .     )##P:  3  J J1((   }IV4'11&#"1132765514717676''13317676''1&'#1'11167655&'&767'76''171676''1716'&1'1&#"1'1&110113121117  .   \P& ,G9!p;;; O A' L L (B $'   ('2J J  3  :P##) 0  666 O  -F J J E- 1$B /Y&'&767553121'&''11#"'&5511'6711671111#"'&551#1"'&7711'&'&77   ;   n  &" 5 a  0 ` `s9  Z@ HU}676'&'7713276551311327655117676''1&'#1"1767%&'&7675'1&17677113676751&'&'3167&'#1&176''      / J-$ : ) 0 788  0 0`000  9  Y" a  A  h;;;* `  87f(2   # 2HY316751&'1167674'#1"11331171&##7315117676''1&'5331276551#"" i6 M   b""p  Y.Z    Rnw67711#1&'3#3&'&'47''101'16331271&76111111'&'#3#"'&5511'&'&771671#'67&'""6662_  8 $L  V 6  L 9""ZZZn  ` @ 4 nZ  -;Hb~316751&##3#67674'533123'16551&'&'#1"7676'&'111331276551&'&'#654''1&1#13117771767513167&'#151&'&1Goow{{{ @$$$$   @@  XX  @H@  XX  @ A   o+ j       8    8 8    8  IVbo}676'&'5#"'&5511'&'&77167633121'&''11#"'&551#61''1&7!61'&77&77161'!''&761'(   :  ;   PPPP0PPPPPP  Ѐ /  a a  / YPPPPPPPPPP  &l21#1511'&'&77167633'676'&'%1171516731111311#11#1&'51#1"'&5514763516751&'673 ' 6  L%2i'((''(('  50,< ԮZ  p----Pt m8U \`   d%2`&113276517111327651&''676'&'553116751176''1&'&##1"1771167       &  &    -nn @ XXXX1 G G 1 Vn676'&'4311271117676''1&''171117676'&''1'1&'&#"117677167771327716771'1&'31127654''1316767&'&'#1"331#171654'&#"1  TG 2   "#3  < =([ D----D )) P P`i@!MX  \ 6A  %5   >>>; > $-w --DD--  )) P P Vn676'&'4311271117676''1&''171117676'&''1'1&'&#"117677167771327716771'1&'% "1#1"331132771654''  TG 2   "#3  < =(   P P`i@!MX  \ 6A  %5   >>>; > $-    P P Vn676'&'4311271117676''1&''171117676'&''1'1&'&#"117677167771327716771'1&'% "1#1"331132771654'''16751&'&'167516751&'&'1675  TG 2   "#3  < =(   P P`i@!MX  \ 6A  %5   >>>; > $-    P P00x00"# Vn676'&'4311271117676''1&''171117676'&''1'1&'&#"117677167771327716771'1&''&1'1&117677167716'  TG 1   "#3  < =(> 6 @ 7 @, `i@!MX  \ 6A  %5   >>>; > $-> 7 o   oL 6Qd11111771111237112367&'&54767'151&'&'4'11&'&#"3276765'1''1&761716: nn #M""&&""""&&""M H ( = Ti B1G+*  "#).&%,T'!!!!''!!!!'+ H ( < 6QZg11111771111237112367&'&54767'151&'&'271167654'&'&#"35&'6751&'5167: nn #M'!!!!''!!!!'Ti B1G+*  "#).&%,T""&&""""&&""`PP6Qs11111771111237112367&'&54767'151&'&'271167654'&'&#"3771''11'&771'1&761716: nn #M'!!!!''!!!!';$$$$ %% $$ %% Ti B1G+*  "#).&%,T""&&""""&&""%%%% $$ %% $$ ?Pt671167111'11111"#'11"#&'514771511'5147715"11131514'&#671167121##1"'&55147635f@: nn :P @ P""  bT:"G+   *+G1B iT 00 ""0   0  .;K^p111&'&'51673#3#1&'673#3#1&'676731#1&'7671&'&'57111&'&'51675&'516767'1&'5167675&'516767&71163!121#!1"'&551&'&'""x0000 pppp00""""P""""`""  %  %"" H`""""""""""  & &@!Mh"11131514'"11131514'&#"11311327655167&56767654'&#!271167654'&'&#"3713121'&771#1"'&7716` @  @  $#8  ##8 '!!!!''!!!!'0$`$` `` ``  ;++ C C=.- ""&&""""&&"" 6H6H@!Mh{"11131514'"11131514'&#"11311327655167&56767654'&#!4'11&'&#"3276765'1''1&761716` @  @  $#8  ##8  ""&&""""&&""M H ( =  `` ``  ;++ C C=.- '!!!!''!!!!'+ H ( < @!Mhq~"11131514'"11131514'&#"11311327655167&56767654'&#!271167654'&'&#"35&'6751&'5167` @  @  $#8  ##8 '!!!!''!!!!' `` ``  ;++ C C=.- ""&&""""&&""`PP@!Mhu"11131514'"11131514'&#"11311327655167&56767654'&#!4'11&'&#"3276765##1&'6731` @  @  $#8  ##8  ""&&""""&&""@ `` ``  ;++ C C=.- '!!!!''!!!!'@!Mh"11131514'"11131514'&#"11311327655167&56767654'&#!271167654'&'&#"37531#11&'51#1&'67315167` @  @  $#8  ##8 '!!!!''!!!!'0000 `` ``  ;++ C C=.- ""&&""""&&""000000@!Mh"11131514'"11131514'&#"11311327655167&56767654'&#!271167654'&'&#"3771''11'&771'1&761716` @  @  $#8  ##8 '!!!!''!!!!';$$$$ %% $$ %%  `` ``  ;++ C C=.- ""&&""""&&""%%%% $$ %% $$ (B\v''&#"11117711765'1716'&''"1113312765514'&##"1113312765514'&##53312765514'&##1"b4& // &4b       0000%54%   @   `@@@ @ )6C^"111327655171#1514'&##3#11317173#37171#11'71317171#3#313276514'&#"1   UU uJJJZJZ*JJJ[JZZJZJ UUU   U    @   6&2?s|!!!21#!1"'&51476316751&'&'167516751&'!!!1#113111##1"'&551&'&'513151#1"'&54763#3#1315`  @(()   )H( PPPP @  @@@@X@@8@@`)@ @)`@  @@@ Idw3#3132765513121&#"514'&#"1327#1"1#1&'&'4716763471167632#"'&'&57&1'1&17716'KKK  K+-%&   v""&&""""&&"" = ( H @ @ x#+ @  @ L '!!!!''!!!!'+ < ( H  Idmz3#3132765513121&#"514'&#"1327#1"1#1&'&'4716763211#"'&'&547676367&'516751&'KKK  K+-%&   v'!!!!''!!!!'@ @ x#+ @  @ L ""&&""""&&""PP Id3#3132765513121&#"514'&#"1327#1"1#1&'&'4716763211#"'&'&5476763776'&1'1&11771176''KKK  K+-%&   v'!!!!''!!!!'$$$ %% $$ %% $@ @ x#+ @  @ L ""&&""""&&""%%% $$ %% $$ % <Rc#3#"13151476321315167516767'1&'&##11#"'&555#"'&551476322111#15147635"13312765514'3&'&' KKKv  ,K  @    @ P  ""  @ @%-V @ @@@@ @  00 000   0""^'=671161516761516761516761#!5!!!2#!1"'&54763@ c c c  D@ @@  K        =F3#3111111##&'673151#1&'673151#1&'673151#1&'673151#1&'673!!!1!1#1131#1131#1131#1131##51515151515133 8 X``  XPPX(  ((  (XPPX8Y3#3716'&'#1#3#111101!16767&'&'&'01&'&''''11'&771'1&761716/ /*) )@) )*//////////`G  G "#78R))R87#"//////////ASex&1#11!111#1516767113167#&'&'676767251&'&'#1'3#31#1&'51673#31#1&'5167713167&'#151&'4'11&'&#"3276765'61''1&7617Rv  @$%%%,;-%& v     @""&&""""&&""c H ( = [  `:) %%% #{ [@@@@ '!!!!''!!!!'+ H ( <ASex&1#11!111#1516767113167#&'&'676767251&'&'#1'3#31#1&'51673#31#1&'5167713167&'#151&'271167654'&'&#"35&'6751&'5167Rv  @$%%%,;-%& v     '!!!!''!!!!' [  `:) %%% #{ [@@@@ ""&&""""&&""`PPASex&1#11!111#1516767113167#&'&'676767251&'&'#1'3#31#1&'51673#31#1&'5167713167&'#151&'271167654'&'&#"37'''11'&771'1&761716Rv  @$%%%,;-%& v     '!!!!''!!!!'$$$ %% $$ %% $ [  `:) %%% #{ [@@@@ ""&&""""&&""%%% $$ %% $$ %@=JZl|3#31#11311#151&'&'1#1&'&'5167673171514763&'&767%1316751&'#5316751&'#11316751&'#!1316751&'# pppOYf  fZ 0  p      @@p  p@@   @@@@@@p@@@@5GYfz61311&'&'1#11113111!1&'&'167673175316751&'#15316751&'#17676'&'7531#1&'5167"11131514'&#671167121##1"'&55147635.v  00 @@  v    2222  @ P""   [ 0  0%` @ [@@@@@@@@H*,,**,,*x ` 00 ""0   0+9@71131514763311&'&'!17'&77167'&7716#3#17 ``` ` ` u  u``` ` 뀀?HQ&#"1767676'4'&''673121331277163111&'&'567&'7&'67  /.VV./ m (0( ))8`P3EEAB+ +BAEE3P 66 v))vEYb&#"1767676'4'&''3676751311311#11"''1&5477'3#311#"'&55167&'67  /.VV./ l, @"0 c ((0  P3EEAB+ +BAEE3P@ "3 * ~  00:&#"1767676'4'&''6711672171631''1&'  /.VV./ }S SP3EEAB+ +BAEE3PR R6Vb671167!11!1&'&'16751176751&'1'1&5167513167&'#1513167&'#13&'1675@L B B 000@`@A fn  fn @@@`P &N111!167671&'&'!676'&'6711671"''11'&'&77167615@@`P7 1 )@p  hf78  ` *;Zmv111!167671&'&'!76'&&'&'&'&76'&'&'67676'&76767672711654'&#"3&'67@@   X@>   531#1513167&'##131#1513167&'#1111&'51'1#1"'&5476331'1#1&'&'6767131'1###1&'&'676733'1514105676321167&'A))(((())+' $)# #b ))P))Pd+  )$_     E@M`"1'1&1111771132771176''17167&''1716'&1'1&#&'&7674'11&#"327654711632176765&'51&'&'1&#176765&'514763211!1"3!127654'&##151515 9 7 7 9 9 7  7 9 $$$$   8     """     X @ h 7 9 9 7 7 9 9 7 `  @   5 !   ! 5""" !   !     `@$7&'11&'!11!151476331577#1211#"'&54763@@`   @ @   @<CV&'11&'67676'3#36767311#1"1!1&'&'1676755312711654'&#"3               A'611###&''1&#1###"'&71677    P d          @K1''1&7615167171661112#!1"'&547633151716773#3'1&# PP (({    PPP= PH H $zz$      z v@+S&1!1716'&1176''1!11771654''&11333276551672133276''1&'' "m! PP !! PP    D <    H H  H H  v   @'O6'&1176''1!116751&'&'!17&11333276551672133276''1&''x PP !q""3!    D <   H H ((3""}  v   ?5]&151&'1'1&17716'!&151&'1'1&17716'&11333276551672133276''1&''(( PP `(( PP     D <  P $zz$ H H $zz$ H H7  v   A71131276''1&''1&&11333276551672133276''1&''       D <  zzz )     v   @,:5!1514'&#!1"#3#11675131167151#5&'5167@  (  @p@@@@@*7Ibo3#321!15147633#!11&'51#11&'1516751&'73#321!15147633#!11&'51#11&'1516751&'        `p@@   `p@@@5[dk|&117676'&5476'&'!11767654'&'&65&'&'1767713117676'#3#7131''#17'6'&76'&547%&7654'?         Q&&&L&}   &    2::2  '--'  '--'  2::2   --  . SSSS #''#   #''#GNY`gs61#1##11312##1"10##1"101#1"'&547633171#1"'&551"'&7677''13'7171'1#771'''1'3167&'#    E _` E    I;;;:uu??t .#n--- "vP P   P PC111155SCCC&&&&C+=M_o6711673113151671311##&'&'5316751&'#11316751&'#5316751&'#171316751&'#5316751&'#1%#11#"'&551#1&'&'67&56767  ` (  ` @           "  #))  HH     P  p    p   )# #) ))-%711'&71676171&547716321#"'XcccB  P Ac _`  cccA P  Bc  `_ (B\v1316731#1&'#11''1&'677164711633121##1"'&553#321##1"'&55147633!!!21#!1"'&5514763YX  XY/   ``` `    H  H `  `  @ @ @ @ @ @ ?JWd~671167!1131211112##1&'&'#1&'&'#1&'&'3#351'1#1676'&'%&'&767&1#13117716'' @ 3M  )))) M3  p''PP  0M @  )))) @M`0  A''PP?JWdy671167!1131211112##1&'&'#1&'&'#1&'&'3#351'1#1676'&'%&'&767%671167&'&'& @ 3M  )))) M3  p   0M @  )))) @M`0  !! !!MVcp671167313113112##1&'&'#1&'&'#1"'&5476351"'&551476353#3'1#1676'&'%&'&767 %4)5  ))))   `VVV++  p`$w  ))))  ` ``0  OXer111"131"33167673167673127654'3&'&'#1&505'1&'#1&'#3#31#15676'&'%&'&767''51671''11&'5167656751671&'&'5167`   ))))  5)4% ++++Vp  ### # }   `  ))))  w$```  0444+`  4+`  @@@@@  @<fr{111117711117711&551&'11515151511151&'&'513167513113167516751&'&'!167311#17&'6767&'{2[ZX  PkQ @%R( !"Ra! +((+ !  O11a &;Ohu67!1!1&'67!1!1&'676'&'671167312#1"'&5&'11&'6331##'##1"'&54767633127676'&''&'&767PPS  3`V ` Rg3  0 ` ,  q--..0H$$$$     >0 /$$$$@'((''((' !5N[h~&'&767113316767&##13#32765&'&'#1"'&##1"3312767&'&'7&'&767676'&'"113!127654'&#!   V`RRR `g ` 0  3  --.. @ `$$$$    >/ 0$$$$`'((''(('    &2?Xew&176''!77716'&7716'&1!76''1&%676'&'31674'&'&'&##1""'676'&'11316767&##67&'&'#1"3'676'&')HH.HHHHHHPHH$$$$l&P($  8 FpF 85  HHHHHHHHHH  P  # %p  P p3@Qcx111!167671&'&'!471163!121#!1"'&5&'&767316767&##13#367&'&'#1"'&##1"31674'&'7&'&767676'&'`))))@  @ 8 Fm888F YP))$$$$)))@)`  @P    / &  & q  P   !3CXer3#367&'#1"1675676'&'11316767&##67&'&'#1"3#&'&##1"31674'7676'&''&'&76773#3167514'&##155&'133167&'#!31276551&'1#0XXXh   8 FpF 8Y)P)$  P  xXXX h8 hXh X hX  P &  &  p $$$$Xh `XXXh  hX"+FY471163332#1&'&'1"'&553151#471167632#"'&'&57&1'1&17716' @ 3) `@@""&&""""&&"" = ( H   ,9&!')  ````'!!!!''!!!!'+ < ( H 1:}"1131674741&'&'676705&547675127654'&##55311#11766767676'&76767&'&'&76'&'&'&''&7211#"'&5476367&'  ), @@@@xh  (  )r  ````X   ` 6'&177'&111&''1&111&''1&111327711327716''1&'7117414567&'71167&'716'&1&6'716'&1&''271167654'&'&#"35&'6751&'5167XX      E E '& ", $. +F.;  :. '!!!!''!!!!'XX '& *! &' *! &' D E  ! "2(  5 .< !!:. ""&&""""&&""`PP JS67116731111&'&'514'&#"1&'&'51676713276551#1&'&'7&'67)&&'&::&'    '&::&'  )`)&V:&''&:P   :&''&:P )+Ll"113!127654'&#!"113!127654'&#!'11771176''1716'&1'1&!&11771176''1716'&1'311771176''1716'&1'1&  @  @ 777777777777777777777777     777777777777777777777777A S&'&76753276551311327655131276''117676''1&'176771133       ;%::%: $$$$PPP PP P]%  N..N  %]r O&'&767&''1&'&11327655131132765167716'&'&1#"'"1"'  g% +   , $$$$i   ) `` +  @#*EX6711673113311#!1&'&'#3#51471167632#"'&'&57&1'1&17716' 8$#"`""&&""""&&"" = ( H  '.->-%%@'!!!!''!!!!'+ < ( H @#*Ee6711673113311#!1&'&'#3#51211#"'&'&54767636'&1'1&11771176''17 8$#"0'!!!!''!!!!'; %% $$ %% $$ '.->-%%@`""&&""""&&""k $$ %% $$ %%/^kx3#3110101#1!3#31#1'1'1&##1'14#67655#3#13167671&'&'!11!117676''131##3#01015147&'&767@.@ DLG)"I...+    ! TJ(JJJEJ  ('2J@[?##) @ `   2  ~0Jg  [67116713276765&'51&'&'1&#13276765&'516767113276551515 ..""33""3""..  H 66 3""""3""3 66    5>%51#!"'&54763!151!1"'&551'1&'&5477167632155%11! P@   $$$*)%F@   0 u  /! 9IOi|"1'&77167!11''1&##113111#1"''1#11##1&'&771&'5167673151#"1113312765514'&##4'11&#"327652711654'&#"3W  **  q()#B( 77 (B#)(qI     `      0)/B 77 B/)0p          +4=FO`671167!11#11311#11311!1&'&'353151#3#3#131553151#53151#%"11131514'&#671167121##1"'&55147635 C8XXXXXXXXXX@ @ P""  `A@ %@@@@@@@@@@@@@@@@@p 00 ""0   0+4=FO`671167!11#11311#11311!1&'&'53151#3#3#1315#3#1315353151#%"11131514'&#671167121##1"'&55147635 C8@XXXXXXXXXX8XX@ @ P""  `A@ %@@@@@@@@@@@@@@@p 00 ""0   0'.11#1"33327654'&##151716'&'!''!1  @ `` @ @&ֳ   ӓ211&'&'676725111&'&'67672515167%16 ))))))@  H"""M"""H` 7%1#"''1&'&'6767271167654'&'&#"3' ~5FX;;;;XX;;'!!!!''!!!!'F5~ ';;XX;;;;X""&&""""&&""%7'327716751&'&'&1'1&'&10  /!!4#!   !#4!!/ ,A6&'     '&6A,,'&'1111771176''1716'&''1'=  @hh @g DD g07271167654'&'&#"3113!12765&'&'#####.K32    23K\""""023K   K32 +;M]o671167!11!1&'&'5316751&'#1%1316751&'#%5316751&'#1%1316751&'#%5316751&'#1%1316751&'#53312765514'&##1""1113312765514'&##0  p    p    p      `@    p    p     @@@ @  @ @ #=5#15135#1513'#3#51313#31#15111!167671&'&'!ࠠ`@@@ "+4=FOXaj111!167671&'&'!5#151333#31#1535#15133#31#1535#151333#31#155#151333#31#1535#1513@XXX8XXXXXXXXXXXX@XXXXXX8XXXXXX@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@"+4=FO671167!11!1&'&'353151#!!!!1!1553151#!!!!1!1553151#!!!!1!15@@@@@@@`@@@@@@@@@@@@@@@@@@@ `111#"''1&547632171632 i W j  ``165114'&#"1'1&#"11327711327654''17W ii jj ii jj) jj ii jj ii<%1#"''1&'&'676767513167&'#151&'1#131' ~5FX;;;;XX;;@@@@F5~ ';;XX;;;;XX@@@@(%1#"''1&'&'6767%3167&'#' ~5FX;;;;XX;;F5~ ';;XX;;;;XL4'11&#"132765567116'&'&6767674'&'&&'&'4767    ) 66CC66 (  21KK21  Y "/08C66  66C80/" ##)K1221K)## `-CZp2111#"'&5147632111#"'&514763#"'&51476322111#"'&55147635#"'&55147632@    `     `    @  `  `   @   @@@ @  `m111''11#"'&''1&'1'&''1&'&771&547'1&76771676167716763217161676'&' ,,   8  8   ,,   8  8  ---- ( (   ::   ' (   99  '((''(('AZ%11#111##1"#"###"'&551514'&##1"11###"#"#"##1"'&5514551#1&'&547%1621@  ! @        @ @ pE   .11&'&'&54767675176''151&'F::$""$::FF::$""$::F ` U!"<=CC=<"!!"<=CC=<"!x @ 9{@8N#3#"131514763213167674'1&'&##11#"'&555#"'&55147632KKKv  vK  @     @ @ L @ @@@@ @ )MV4'11&#"1'1&#"132771654'&#"15111!1676751&'&'#11#"''1#&'67  I Ie.-fp J J  --8!:"1111!16767514''1&'&#!!!!1#11#1&''1&'#17y9903  x  30 \\ @F#3#"3312765514'&#"1'1&'&767654'&#"#"'&547632222   ,9999,,,,9999, 1@@1//1@@1   3,,,9999,,, //1@@1//<7676321#1"3310101112765514'&#"1'1&'&76713276551111767676'&'&#"'11'13127654'&##1"##i 1@@1" p  ,9999,% B  ,9999,%  1@@1" p"//  p #,,%.  Vp #,,%.  "//  @,?R^jv671167!11!1&'&'2711654'&#"374'11&#"327652711654'&#"373167&'#3167&'#3167&'#@       ``@        ``653151&'&'5567671311!1&'&'5167673""@()==)(00000""0000=)(()=054'11&#"11132765517167716751&'&1#"'&15@   @@;EI"  $&E  p "  B11631&'&'515151676767111&'&'5167672&'&'Q99   """:9HH9:"""   99Qp32O  "00H9:"""":9H00"  O23@&'&1#11311767@DD  x@x  -1''1#1&'&'51676731716'&767&'&76-DDp!!     x@x //  1B_11'&767654'&'&7611'&767&'&76'&767&'&76'1''1#1&'&'5167673171611 )) =!! 33 C66  h`"!7 ./9K0:$$''BAQA7 ;6676&'&'&'676727676'&1'&'&'&3)% 32??32++GC%      1 &.  @55  55@,9F6731!11#!11!1!1"'&'1&##1&'676'&'%&'&767." ) 4.P  H  0!!!!67671&'&'#1"''1&'#11@    D1771676731213311!167!11!1&'&77YYYYvu$  p p p   = "1327711'1&#"132771654'&#"111327654'' ` )) ` ` )) ` ` ** ` ` *&* `@@=%77654''1&#"1!171654'&#"11327654''1!11327``` ` ** ` ` *&* I``` ` )) ` ` ))  7Mc2111!12#!1&'&'14763471163312##1"'&53#32##1"'&54763!!!2#!1"'&54763   p" `          "P `  @   `   ?L77311#1&'#1513127!167671&'&'#1"1#151&'#11676'&'222s!,,!s 3 @*,,**,,*G`@ @2222,9%671167&'&'113167513167513127713&'&767PK1221KK12P(( !(  `21KK1221K P((!xan6'&''1&'&1&''1&' "1'1&11117711327677167176771676''1654'7676'&'76771676''1677167654'&''1&'716'&''1&'&1&#"'1&111111771327'&'&7675                        )  9              )            (U7671167&'&'1#11111676771167676'11111105"1&'&'&'67&'&'X;;;;XX;;'  " /:=>Z66I:/ "   '66S`21KK1221K;,   V88 9#$   ,;G11111177123#  @hg D)W%65114''1&#"1#1"33113277%2711654'&##113127654'&##1"'&5147633 J J  @))@ @ @ I  I  ))   .=471163!12##111#!1"'&7716771#1"'&53#31#"'&55   9  9  @@@    @ @ ` `)]"11331132771132765514'&##111!16767514'&#"1!1&'1673127654'&##@ S  ""@"  p p  S  """p p@  -W3#321##1"33167671&'&'#1"365114''1&#"1#1"33113277`@@@ @ @))@  J J `   ))  I  I @M[h#3##1##1"33127654'&##1"'&5476767676767&'#1654'&'3#3&'&'&'676731 j#!%%    %%""j TTT&##&T E21!       !12E pC//!##1!//C1##(LU5#"'&5511#"'&547716321#"''3#36767311!1&'&'51676767&'  I IpS J J  h2E&'11&'"'&27676767676'&7676511'&767676 998,+ 998,+*  %%2 `+,899 +,899   * 2%%'&'11&167716'&''1&1&'&'716'' X< ?  //  ? > -- > ?  ..  ? > --  ? > -- > ?  ..  ? > -- > ?  //%<R211##1513211##1"'&547633711##1"'&54763312211##1"'&547633'3#3#1&'&'51677167311#"'&551&'1 Р @ @@ 0 0 ` @ @X  D--. %5  `  @   @     `--D>B/ %X 88%<R"1133151#"1133127654'&##'1133127654'&##1""1133127654'&##7#3#31676751&''1&'#113276551671  Р @ @@ 0 0 ` @ @X  D--. &5  `  @   @     `--D>B/ %X 88%<R47116321#1547116321#"'&55'2111#"'&551476347116321#"'&55553273271#1&''1&'516767312##1316767  @   @     `--D>B/ %X 88 Р @ @@ 0 0 ` @ @X  D--. &5  %<R113276551#171132765514'&#"271165514'&#"1371132765514'&#"'56326763251&'&'#1113127654'&##1&'6731  @   @     `--D>B/ %X 88  Р @ @@ 0 0 ` @ @X  D--. %5  4%&'11&'&#"3276767%6131#11''1&77!"<=CC=<"!!"<=CC=<"!GGppF::$""$::FF::$""$::FGGpp47113276767&'&'&#"'&771#1&'6731'1&761!"<=CC=<"!!"<=CC=<"!GGppF::$""$::FF::$""$::FGGpp4671167654'&'&'''11&'511'&7716F::$""$::FF::$""$::FGGpp@!"<=CC=<"!!"<=CC=<"!GGpp4116767654'&'&'&761516717161''F::$""$::FF::$""$::FGGpp!"<=CC=<"!!"<=CC=<"!GGpp  $4>L[cm%#1&5473173#3#1654'7#3#&'##3#676766##3#67673#3#1&547&'31''&''&'&'3!11673`{{{{pttt(<-,   ttt,-<({{{{  <(<-,tf,-;'t!!!!@!!!! b6'(87(##(78('6b !!!!(77(##_b6'(88('6b4=%6711674'&'&1##1&'5147716'&'&#127713&'67`D--M9MD-- --DL9M--D X)@Wn{1#"''1&7617161#"''1&7617167471163312##1"'&5471163312##1"'&5471163!12#!1"'&5'&'&767 H (7 H (7H     @    p  P(= P(= f      067!111''1&551'1&7  @    0 O /P3#31#151675#113!51&'&'#151&'&'#1#3#1##1"'&551#11!1676758@@@ @ (((((``(   a "1311#151&'&1176751311#11327716'&'#151311771654''1&1#15131676'' @  `@ @`  @ @ `@ @`  @ @`  @ @ `@ @`  @ @ `@ 0Fat&'&767!&'&7676711673120101#1&'011101674'6331#'471167632#"'&'&567116731!1&'----p----.*))*.ֵ   `&&8v8&&'((''((''((''(('. ;%%; .`  8&&&&8n={%65114'&'&177161#"'&'&7716'&'&13277%11771676'&'&1'&'&547716321767716'&'&#"D**'43,  q  &-9:-p**'43-  p  &-9:,q-:9-%  !q  ,43'**p-:9-%  !q  ,43'**p(711!16767&'&'65&'&'"&'&'01()=p6%$,)$$-D--+p=)($%6/"# )$--D$$0.@#3#"311!167674''1&55127654'&##553111#17165   m 6 l   `@#"    Ņ$88$0=JW''65&'&'2711&#67674'16'&#"'3276''1'676'&'&'&767''' 00  0''0  00  vvv @0  '''0  00 '( 00  0 vvv @  =3#3211#1&'&'167673#31#113151311#1&'&'16767|||D   PPP@@   D    @ 0    N&11"1327716321#"'&547716321#"'&547716321771654'l !++! 3AA300%//%##  l!++!  003AA3##%//% 5B111!16767514''1&##4711633121##1"'&55&'&767@@M   $$$$M` @ @  671167!11!1&'&'@`@-D471163!12#!1"'&5471163!12#!1"'&511#!1"'&54763!12        `        "8N[h676'&'7"113!127654'&#!"113!127654'&#!"113!127654'&#!676'&'7&'&767@             00P       P  AWm6731131#1&'673151#1&'&1'&771676131#1&'&7716'!!!2#!1"'&54763!!!2#!1"'&54763!!!2#!1"'&54763 P?  #!X H      x`  &  N        Bu6767676'&'&'&'&01#1"3!127654'&##10101#1&'&'&7'&'&'"1&'&'&2111111117676'#1!8    E7: ]  7 !8  E7:L 0   @#        @ F]471163312##11676751#1"'&54763312##11&'&'51#1"'&5471163!12#!1"'&5 ` )) ` --DD--      ))   D----D   #=755311#3#31#1555311#7#3#5131%111!167671&'&'!@ࠠ````@`````````@"&51147163211#"''77'11}##Niiii}##iiii?JWd1113167673167673127654'�''1&##151&'&'!3#311#15676'&'%&'&7670  ))))  M3 p333Mp    ))))  @ M0 M`  0@#-7A\111!167671&'&'!#3#51'55316711671#7&'11&'31'211#"'&'&5476763@@@@@@@@@@@  @@@@@@   @E731127716'&'!1   I E@ "1!1676''   7 e7&511477161''    @e765114''1&177    "+671167!11!1&'&'311#!#3#131@`@@E'631121!1&'&77''&767!11#"'       R E#11"''1&767!1    E "1!1676''    ,11177167&'&'!5!16767511#"''0  `0   pУ F3#32##1"'&55147632171676'&'&547632327654'&#"~222   ,9999,,,,9999, 1@@1//1@@1   3,,,9999,,, //1@@1//9[ "113277111132771654''1&#"1'171654'' "1132771654''171'11'? x  j  x  j  p 0 p ;-; x  j  x  j  p 0 p ;-;6'&13117%16'&'#17]  pM oL  @671167311#11311311#1&'&'5167673151&'#11311#1&'&'5167673151#11311#1&'&'516767315167673151#1&'&'5 @    @    @    @   p  @ (  @  @  ( @  @ (  @  @  ( @>>_2111'&'&#&'&'&'&'&'&'"'&5676751476321"'&''1&767613675163  eEF  FEe  "      @@`    `@@  s"    s "@I#1131167673151&'&'#1&'1111316767514''1&##'&'67%9  "0 9%p   DL  "    DXp0A%671141116767&'&'111367116751#11&'6767 21KK12 P""P 0"@.' +9K1221K9+ '/""P0 ")S65114''1&#"1!1"3!11327731127654''1!127654'&#!171654'&#"1 ` * 3* ` *3 * ` `) ` )  ) ` )  ) ` `%A&'11&'676745676763!7'7716'&151&'1'1&=)(+--D-$$),$%6OPPPP'' ()=0$$D--$) #"/6%$PPPP''%?&'11&'676745676763!777116751176''1&=)(+--D-$$),$%6O''PP ()=0$$D--$) #"/6%$''PPt}7271167654'&'&#"3113!12765&'&'11#1&'67514'&#"1#1&'51476751&##1"1&'&'4767567&'####`9##    ##9     \   """"7.->   >-.3( (9A; 0^q1111676751'1&'&767611676751&'&567671&'&'&'&'5147677162711654'&#"3 ))   #$7,0  "" 21KG119#$  R    y))y  y;+* + 0G "" GK12-.F ++;y    &8J53151&'#155676731111!115#3#31#1&'&'16767#3#13110@  ((((((((( ` ,7"11111!1676''1&'51&'&'514'&#65##327 8#$/    0$#8 -@@  ++;H7  6I;++  ,B471163!3#1#1&'&'53#36767&'&'#1!!!2#!1"'&54763` @@6%$$%6 ))  @   $%66%$))   Ek671167311#151&'&'1#13#31#1&'&'513167&'#1513167&'#1516767!111#1311#1311#113%1#11311316751316751&'#151&'#  P  Ppppp PPPP   PPPP pp  0P  P0` @0  0@  ?JWd671167!1131211112##1&'&'#1&'&'#1&'&'3#351'1#1676'&'%&'&7675#11311316751316751&'#151&'#1 @ 3M  )))) M3  p00 00   0M @  )))) @M`0  P000 00 0 '8Iq3#31#15167511!115151&'&'#1#3#1313#367671&'&'#167311311#11#1&'51#1&'51673158  @   00 00((((( ` ((0 00 0Xd6731#1131211##1131#1&'673151#11##1"'&551"'&5476351476331213151#1&'3167&'#pht ff thp 7     7 P@@&&7 @  @ 7 )6BNZ471163!12131111#1&'&'776551&'#1'&'16753&'16753&'1675   3! R`888 3@@  !f %"`f =111!167671&'&'!51&'51#11&'51671315167@@@xhhhhPPPP;111!167671&'&'!55#1&'67315167131#11&'@@@@@@@@@@@@@ ;7111327654''171654'&#"%71327654''171654'&#") ` @;%65114''1&#"11327777654''1&#"11327  ; "1327711327654''''&#"1327711327654'   ;#11"''1&5476321716327#"''1&547632171632  `  7111327654''171654'&#") @ %111#"'&54771'1&547632  `@631121#"''11#"'&5477 7  @ 73112771654'&#"1'1&#" I )111311!11311&'&'!!16767&'!@@m!!!!,111!167671&'&'!211#"'&54763@@  p   p,1113167671&'&'#211#"'&54763Pp  p    `/_7671167312##11311#1&'&'51515!671167312##11311#1&'&'51515""3 @@""3 @@3""  @ H3""  @ H `/_%11#1"'&5476331676751#1&'&'5167673111!11#1"'&5476331676751#1&'&'5167673111""3 @@""3 @@3""  @ H3""  @ H &3@MZ&'&767&'&767%676'&'%&'&7676'&'&76'&'&77676'&0    `  0  &671167654'&'&'F::$""$::FF::$""$::F@!"<=CC=<"!!"<=CC=<"!5H[671167654'&'&''1167676&'&'&76'6711632#"'&'7211#"'&'6763F::$""$::FF::$""$::F\!! ))       @!"<=CC=<"!!"<=CC=<"!    v     3FY671167654'&'&'''&76767'&'&''6711632#"'&'7211#"'&'6763F::$""$::FF::$""$::Fa  ""..""   ##       @!"<=CC=<"!!"<=CC=<"!{ ((      -@N671167654'&'&'211#"'&'67636711632#"'&'3#3#1&'67F::$""$::FF::$""$::FP      @!"<=CC=<"!!"<=CC=<"!P     "/O11!16767&'&'!&'&767676'&''67131#11&'51#1&'67315R6666RR6666R0  h    66RR6666RR66h  h    @+;M]o111!167671&'&'!3#31#1&'516767311#1&'53#31#1&'5167767311#1&'53#31#1&'516767311#1&'573#31#1&'516767311#1&'573#31#1&'516767311#1&'573#31#1&'516767311#1&'53#31#1&'5167@@      P    p    p    p      @  p  P    P  p    p  p  p  p  p  P  8y211171632771611'&11#"'&5515115147637711171675171635111'1&'151151&''151&'&'1"1511771511'755#177  E;7#&&$  "IE;@@   @@@@1' * ! ) @@!   "` PB  BA @ @C G F@ > HKI HNGGG E@3&5114763211#"'&54771'!!!2#!1"'&54763     i   5T&11176716'&'111132771654''1&#"! "11327654''171654'   P ZZ p p p p ZZ  @   x YY p p p p YY @D&1176''1716'&'&11767513127676767&'&'#15  )  21K0    @)  %%8K12@ 6'&13117 d `T77654'&#"1#1131114'&#"1#1"33113151#171132765513127654'&##1777 6        S666 7@3   @   Ybk67&'71116331676751&'&567671#11&'&'47675151&'&567673&'6767&'PP #` "" $%6` ""  ""X X "" 6%$ ""  ""7Adl&176''171654'&'&177161'16'&'&'&'611'7771676'&'&1'&'&54771'7'' P [**'43,  `  )55,sz999**'43-  =2h-&&& 0 oZ-:9-%  !`)+,!'!s !*Z888-:9-%  !>(R>0  9676'&'4711633121312##1"'&547633151#1"'&500 @     p      !k4'&131"33327654'"1133111#1"3312771133127654'&##1'1713127654'&##1"1'1&##     @ ZZ   VV   ZZ   VV    P     zz   zzIk"1133111#1"3312771133127654'&##1'1713127654'&##1"1'1&##4'&131"33327654'  ZZ   VV   ZZ   VV          zz   zz  P   ' #.7133327654'&##171654''1&#"#3#'1711#Pi | rP|DP  P}Cp&'&'67673116767&'&'1#1&'6767&'&'#1&'&'51676767&'&'&'5167673167  9      9  y      yW     9  y      y  9 pH111676751&'&'&'11#13367&'#151676751&'1&'&'5))))+*B0HH0B*+$%66%$))))(D00 "" 00D((6%$$%6('Q&176''16751&'1'151&'&'1'''#&'&'51'111#13367&'#15167' P ))j+++6%$/+*B0HH0 0 |(1(( ))6i"""$%6 %(D00 ""21'&'&'&747677163 /.VV./ P3EEAB+ +BAEE3P->5#11!151&'&'#1514'&#"1#1514'&#"!!!1!16767`0  0   `@@ `   00       @QZ1''1&'#111#151476751'&76767514763312131677165#1&'&'51367&' A8 ! *   A `p `  #""5 &    g  @5B7''&767#1"'&7716731676767611'&551'7676'&' j5)R*2211%<"Y    ? Y"<%1122*R)5k ,%&'11&'&#"3276767'611''1&77!"<=CC=<"!!"<=CC=<"!WWhhF::$""$::FF::$""$::FyWWhh,7113276767&'&'&#"'&771'1&761!"<=CC=<"!!"<=CC=<"!WWhhF::$""$::FF::$""$::FyWWhh,671167654'&'&'7''11'&7716F::$""$::FF::$""$::FyWWhh@!"<=CC=<"!!"<=CC=<"!WWhh,116767654'&'&'&7617161''F::$""$::FF::$""$::FyWWhh!"<=CC=<"!!"<=CC=<"!WWhhG|11#"'&54763267&'&'#1"3311#1&'&'51176''1&1771133676751176''1&17711#1513127654'&##@   ))))   0)88--DPPD--88)0   `  P4))4  )88D----D88)  8N111311!1&'&'51676731516767'&'&'&#2711654'&##1"33"()=,""    @ @"00=)(%     5B]p%4'11&'&#"3276765!671167632#"'&'&'676'&'5211#"'&'&54767634711632#"'&5--33----33--@!"<=CC=<"!!"<=CC=<"!----'!!!!''!!!!'   4,,,,44,,,,4F::$""$::FF::$""$::FP'((''(('""&&""""&&""   &7676'&'3676'&'7&'&767       8 &7676'&'5676'&'7&'&767@     8Xh   ,=P111!167671&'&'!67&'&'&'&'67&'&'&'&'4711632#"'&5@@ E88!!98UA*+,   @h!!88EU89`+*A,x  -7671167632#"'&'&'71771654''1&!"<=CC=<"!!"<=CC=<"! F::$""$::FF::$""$::FmX X@-?Y1111!1676751&'&'676751&'&'!5!16751&'!1'471163!121#!1"'&55@@@  @  @ "" @@ "" @p  '111!167671&'&'!3#3#1&'67@@X@`57"11331676711327654''1&#"1327711##  `)I I `  )3J J `5"'11&54763311716321#"''1&547632114'&##  `)I I `  )J J3 -111!167671&'&'!7''1&761716@@@/o@@/o+?111!167671&'&'!'1'17163277111'&77167@@ G  iiiGi < @l  G iiiGi < 3111!1&'&'16767!31177116751&'#@^@pf06h%#3##1"'&'&'&'676731514763211##1"'&55%1!16751476321!1&'&'16767312##`...#  ()=P   @  """0 0#  /=)(= |  } @0 0""@"  0C671167654'&'&'77'&771677161'4'11&#"32765F::$""$::FF::$""$::F3 8  8    @!"<=CC=<"!!"<=CC=<"!888  8  E  ,6711671&'&'!11!'"''1&767311#@ h  h @p    p,111!167671&'&'!21#1&'&77163@@ h  h @p    p,&'11&'!11!167671'&'516761@p    p`@ h  h @g711011#1"3313127654'&##1&'&'3127654'&##14551453127654'&##167673127654'&##1#1"330 66H ,##~  ~##, H66   @'(  $    $  ('@  BQ671167217676'&''1&#1#1"33111!127654'&##15165513127654'&##15p Q  Q6$%    p p  %$6@  -2  &,-  @+:471163311'&''1#11#"'&55153#36767&'&'#131'1111&'&' &#&'&'&76761107676'&'&''1&'&'&7676'&'&'& P=)('4 8*  @000""0   $"'     ##'      ()=-#"   ""   +    + BY&'11&1#1"3311#1"331132765513127654'&##1513127654'&##1716'&'&1'; _4 PP P  P PP 4_ ee    @ @    GW"111#1"3311#1"331132765513127654'&##151316767&'&'##3#5131`       p=)(()=pppp""       ()==)(""OV]d&'11&1#1"33113677131127713127654'&##1716'&'&1#1'1&'1#1'3#31'7771#3#31'> 2 )9*.*9) 2 9@**@9N m`       ..@@..$6711673113311!1&'&'#3#51  @$2@N111!167671#1"'&551#3531'3#3#1&'673#3#1&'673#3#1&'67@  @@''Nqx#"''1&767611476321716767471163311312##1&'&771#1"'&511'&''1#11'&'&77171673#3'1  X    X  J3  J3 ` @ X @ ((( `  $. $  ` I  I      ((''Nqx&#"176771132765117676''1133113127654'&##1716'&'#1"11767713117676''1'1&'771#  X    X 3J  3J  ` @ X @ ( `  $ .$  ` I  I      ((((@'=Si#"''1&76761147632171676"'11&54763312##5"'11&54763312##5"'11&54763312##5"'11&54763312##  X    X     ` `     `  $. $  `         @'=Si&#"176771132765117676''3#327654'&##1"353#327654'&##1"353#327654'&##1"353#327654'&##1"3  X    X    ``` `      `  $ .$  `K         '*Sf&17711#1"33327654'&##1514'27716'&'&114'&#"1'1&'&13%611'&'&76777677165&'&'0   00   X    X     1%%  4   ` F `  $. $  `   q  B$%% '*Sf1312###"'&5476331511'&'&767716%21'&''11#"'&511'&'&7716367116'&'&7&'11&567671'&'&77  00   0 X    X    )%%1  `   4   `  $ .$  `   7 %%$B  <V11131#1"''1&'515151677167716763#321##1"'&55147639    a&*#) @@@ @  (#   "  3&0.!3     <V67116''1&'316767&'674'&'65&'65&'&'#1"1111117%3#32765514'&##1"139    a&*#) @@@ @  (#   "  3&0.!3  _    `)3112771654'&#"114'&#"1'1&#" I  I 7 Js J  `) "13277113276511327654'' I  I  J sJ  `)7111327654''1!127654'&#!171654'&#" Js J I  I  `)%65114''1&#"1!1"3!113277 J sJ I  I B Y&'&767#3#"'&7711'&'&77167633121'&''11##11#"'&551#11#"'&55  H&" 5 5 "&    s9  ZZ  9s` `` `B I676'&'5#"'&5511'&'&77167633121'&''11#"'&551#p(   :  ;     Ѐ 0  a a  0 @[v111111''11'&''1'1&'&771'1&76771716761716471167632#"'&'&534'11&'&#"3276765jl>>lZZl>>lZZ   """"lZZl>>lZZl>>  ####&1111676'&#&'&'47676'&'&#?2332?]> J21(  32??23= 21K2(( *7!!!21#!1"'&5514763!!!1!1&'&'3167&'#1 @ @ @     P111##1"'&551676763112106331247716321312##11#"''151&'1&'1#"'&5477167&5#1"'&547633167&''1&547) ) @p@ @ @ @@ ?%55%? @@ @ @ )  )i @ @ @  % @ ?!!? @ %  @ ,711!167671&'&'!17477161''1&5@p    p @ h  h 5671167654'&'&'211#"'&'&5476763F::$""$::FF::$""$::F  @!"<=CC=<"!!"<=CC=<"!`    -n676'&'6'&67676'&#&'&'67677''&'&#131233121771676'&'&1'1&'&##1'13127654'&##  G /--D.%%  !0 !  ^ $ 0   E ? L` ((4D--'  0$ G  t a  D0  Bi671167217676'&''1&#1#1"3311#1"3311!127654'&##151673127654'&##1513127654'&##15p Q  Q6$%      q pp p  %$6   2  "    Qc2771#113''&##113!55#1131"1113#1131513167!127676'&'&#!1&'#5#"551432>5kkkk5>   ) 5.." "..5)  @``@@@ ```` 0  0 `,,t X )A111!167671&'&'!''67!11#&'771#!1"'&5511327@@  @ddddYYY~ ~YL_71!16751676''1&#3#1#1!1676''1"1"551#11#151#11#151#11#157211#"'&54763 s@@@00@(@0@(  ```  `     @V"11117676'&'51676771611327%167&'%1&#116767'11#"''1@ : @     66RR66e'1,%B*.$ > =:ee33"8?6711673!1!!&'&'!!11!&'177131176'''#17%133#111''1&'1'&77167'1&761167##&'67315167@@ @ J @& ,     #H4@0    9++++E$      7M`s53151311131514''1&##1331276514'&##1"!!!13!1276514'&#211#"'&547634711632#"'&5211#"'&547634711632#"'&5@@     ` @   `        ````CC`@ @    @     `     '7IYk{1113151676713167671&'&'!67311#1&'573#31#1&'516767311#1&'5'3#31#1&'516767311#1&'573#31#1&'51670  `  `    p  P    P  p   ` P  P              B G676'&'5#"'&5511'&'&771676321'&''11#"'&551#`  0   ($$(   $$$$``` !  ??  ! `%Pcv11'&'&767611'&'&767667116711661#"''1&1#"'&55147%&'11&7676''&'11&7676'   $#"!!"#$ XX ap  c! !! !j  F'&&'F  v   ] !! !!(16111''1&'&551476777171'77511   DDDD<>>>>>>9999@ =FR[eq'1'17165"11177117716751&''1—&''1&175171'1'1716557117611'17751711#NNNQQN`"!`qr` "`"``"RRRRNNNQQNRRNQQNfMMMR ,ppp$&w#* 11 *$w&$p&$$&vY Z(ddd `$"""d [)Z6717161''1&'&771'1&'1'&'&776111#11''1&771613127654''1&767%''&7677161''113312##1&'&'47744' W &    )` @@ `   W 3    )2,,> X <   ()  @@   ' W R   )P GZm7!1'1&'#1776763312111##1"'&551!11##1"'&5515147674'11&#"327652711654'&#"3&_###  #     X      KKKKKPeeee0 00 0[     M[n"1110101111331276551!11331276551514'&''1&'&'0101514'&##3#31!17167211#"'&547634711632#"'&5  #   @   #  E       e0 00 0e  KK     A7311311311327655131674''131674''131674''1&#"ӕI!K  K!I I Z     Z I *>5&'&'516767671&'&'516767671&'&'5@?__?@@?__?@7 @?__?@ FccFw FccF @?__?@p000""0"" f""f   V""V!(BLbn6711673113311#11#1&'&'#3#513#3#11&'51516767&'#11373#31#1&'51676751&'#11376731#1131#11&'515 0  `     P0   @ 0PP0P @ @`p 0@@$J111!167671#1"'&551#3531''716717161"''11&''1&76@ 0!!0 YYYZZY__$F111!167671#1"'&551#3531''71611''11'&771'1&76@ d$$$$ // $$ //  4444 BB 44 BB $>N111!167671#1"'&551#3531'3#3#11&'5151672711654'&##113@ xDDD  ,D  ,,   8hh 8$7R111!167671#1"'&551#3531'4711632#"'&521###"'&77163217163@   X X 0  0     PF$1>Kam111!167671#1"'&551#3531'6731#1&'6731#1&'6731#1&'67311&'&'4773167&'#@          0@@HXXX$?Xi111!167671#1"'&551#3531'11'&767654'&'&761''1#1&'5167317166'&7654'&7@      \ $!!$ 3    ##   #0##   $>P111!167671#1"'&551#3531'4711633121##1"'&55''5171631"'@ ` ` ----    ` `n@ h $8L111!167671#1"'&551#3531'71''1&77167'1'&771'1&76@ g00p0000 00"0000 ,:HVc%&'71327367&'6'&&'&76776''''654'717&#"'1677&'6717676'&'o0??0::[44 B[[B 44B[[B .::::#".::::0??0:::##:2#"": :B[[B 44B[[B 44.::::0??0 ::::##:::0??0:5  6116767&'&'&'&7676&'&'&'67676 <&&66RR66&%=  Q22"":9HH9:""22Q  12BR6666RB21 BAYH9:"""":9HYAB &1''11'&'5147716'&1'1&'4716@ xD X `1J T ,   9L''&131676''167&'&676767&'&'&'"1176''151&'K""" n 6RR6666R>0  ?SH9:"""":9H5/.#HAu""" n 666RR66! -"":9HH9:""#5h HA^n471163332##113151#1"'&54763332##111312###"'&547633151#11312###"'&54763315151#1"'&5 00  00  00  00    pp        13#32##11#"'&51#11#"'&551#1&'&'6767@@    D----D   ` `--DD--*=P{711331327673127654'&##1&'&#"#1"34711632#"'&574711632#"'&57"11#1"331327673127654'&##1&'&#'"'11&547632#7&'11&#"#1"331327673127654'&## 7     7         7 7   I  W W              P       0   @      :%671167&'&'1&'6716767&'&''1654'71`)))^())(^)))(^^()))/))/)))//P111!167671&'&'!11"'1163&'&'45'1&'&'676771456767@@@UUQQ@./-- @Z''&#"111167717167&'' "1&#67674'71654''111&'51676731#.... "%X;;;;XX;;  P,'&:------5  ;;XX;;;;X%! PW,:&'5Pd%''"1#"''1&'&#1&'71676''16713277111671167654'&'&'&113167716''GGGG= 0770 =F::$""$::FF::$""$::F0 < 0XFF)5&B'..'B'4)!"<=CC=<"!!"<=CC=<"!F # 88 # #3CUew7''&767671''1&'51&11'67311#1&'567311#1&'573#31#1&'516767311#1&'573#31#1&'516767311#1&'53#31#1&'516767311#1&'5&=%/%5567#671167211&'&'&'''130?23:9Z 6%$$%66%$;;; <@1 0eeeeSS  Tfw111121#1#1##1"'&551#11##1"'&551"'&551"'&5514763115111516767533151#1"3#32765514'&##12711654'&#"3!2711654'&#"3&'#13167 f<=         =,9Fg6731!11#!11!1!1"'&'1&##1&'676'&'%&'&76731167513167&'#151&'1#1." ) 4.P  ,,,,H  0,,,,>CP]31213!167&'!1&''1!12767716'&'#117161''1&76151#1&'#676'&'%&'&767.4  ) @@#.  Pf@@f0   "1132771654''      B;H471163312131111#"'&#""''1&76771516767315776151!167116'&'&'&'&''&'&76767611676  0 , e!e , 0 llll#**#  &-21  12,&  #*+#   \ \  $$$$[[       Ljs|&'"1&'#113!127654'&'7165&'#1654'674'&'&'&'01"1#3#&'&#"#1"'&5513271#'1'177'1717  $> < '!    !' < >$  8     +55+ X 0@000 @#  a%%,   ,%%a  #  ` Qk3111'1&##1"13131&5476716767&'&'"'1312765514'&##1"1'1&'#'76''123&'&'4711#&'&'6767231&'&'6767#2711654'&#"3:b-e `D--F-$%66%$$%67>  / ?  C ""06%$$%60"" C;  R-  --D(!!%>6%$$%66%$f   (444 5A  -$%66%$-    2k&'&767111331131677131276551&'&'#6'&67676767&'&'&'&&'&'&76767@  `  &  @\2   "EeeE"    2- =``> -$$$$`0 dd 0            !Y''&'316771127711311#"'%#3#"''1&'1'1&#1##1"&551676761716761䴴W$ 1*"h  )3 k !!4#!   !#4!! n  U /  SrL6&'     '&6pT471167632#"'&'&5671167&'&'1#1"331132765513127654'&##15P?((21KK12((?       0/BK1221KB/0 #     #&-H67311''11&'&'676771'1&7111111271167654'&'&#"3"p !521KK1221K8,4! np !4,8K1221KK125! !pFa61167676131#11&'51#1&'673151&'&'4767&'&7671132767654'&'&#"H //  #+*B    B*+$   ##   &&.D00  00D.&&  `BId67311''11131#11&'51#1&'673151&'&'676771'1&71111114'11&'&#"3276765Rp '&&;;&&--D=+' n`   p '%0=,+    +,=D--%' !  k211716116771'1&767311''11131#11&'51#1&'673151&'&'67'11'&771'11'&'516734'11&'&#"3276765p )66)E ` E&&;;&& `    E ` E)6=,+  +,=6) `  pU7271167654'&'&#"37111312##11#"'&551#1"'&547633151&'&'6767676767&'&'&'671312##11#"'&551#1"'&547633151&'((?      ?((21KK12'0  0'-;K12((?      ( pB/0 #     # 0/BK1221K 00 !21KB/0 #     #%,G11&'6767&'71176751&'#111111471167632#"'&'&5671167&'71176751&'#111111110#0"'38 !4,8K1221KK125! pX0K125! p!(!$ 0" !521KK1221K8,4! p021K8,4! p !)$ 30  U7271167654'&'&#"37111312##11#"'&551#1"'&547633151&'&'6767676767&'&'"&'6371'1&767311''11&'((?      ?((21KK12P-0  0 8,! p !21KN2pB/0 #     # 0/BK1221K 00  ! p !,8K125 9@[11'1&11&'6767&'71176''171176751&'#111111471167632#"'&'&5x !,8K1221KK12! pX !21KK1221K8,! p0@?Z61#1131#11&'&'6767414151#1&'673151#1"'&774'11&'&#"3276765 @ (  ;&&--DD--&&;  ( @k    @  +,=D----D=,+  @   wpV7271167654'&'&#"3711&'&'67673151671315167611'&'51#11&'51# 00DK1221KD00 "  PP  "PXB*+21KK12+*B888 PP 888p8471167632#"'&'&5671167&'&'1327655P?((21KK12((?   0/BK1221KB/0  pp5211#"'&'&5476763271167654'&'&#"30((((00((((00)*..*))*..*)"+ENW111!1676751&'&'!&'6767&'111!1676751&'&'!&'6767&'@08@@H@@H1S471167632#"'&'&567116731#!1"'&5%55#1&'67315167131#11&'`""""`23K\K32  |  @@@@@####K3223K   @@@@@@1R471167632#"'&'&567116731#!1"'&56171611''11'&771'1&7`""""`23K\K32  |  ////////@####K3223K   S////////4A211131514763311#"'&551#!1#"'&514763&'&767  )   ----  )    `'((''(('1KX1111312771311331676''167671&'&'!471163!121#!1"'&55&'&767`)#.( 77 (.#)     )%. 77 .%)` ` `1Kex1111312771311331676''167671&'&'!4711633121##1"'&5573#321##1"'&55147634711632#"'&5%211#"'&54763`)#.( 77 (.#) P P PPP P       )%. 77 .%) ` ` ` `       @`5>1!1&'5167!%111!16767512765514'3&'&'!!!!1!15""" "p`` @""" @ "` @`5>1!1&'5167!%111!16767512765514'3&'&'!!!!1!15""" " @""" @ "` @`5>1!1&'5167!%111!16767512765514'3&'&'!#3#1315""" " @""" @ "` @`5>1!1&'5167!%111!16767512765514'3&'&'!#3#1315""" "p```` @""" @ "` @`51!16751&'!671167!1121#1!1&'&'5PP"" "" "" @ ""@!277117676''131674'%1&# R: 8v s_t  r j1111#1"3311#17716717676'&'#1&'&'513127654'&##151676771676'&'&1&''1&        4!!4         4!!4  `  `  &&   `  `   &&  @'9Sp&'6767!1671&'!1&'&'67%!!!1!1671&'4711633121##1"'&553#36767513121##1"'&55 %R%%%RR   @  I%%%%@ ` ` `  '7k&'676731671&'#1&'&'67571316751&'#&'&'6751311316751&'#1&'5131671&'# %%%%W%@. I%%I%%r%%rrr%))r%r%,111315167673151&'&'!#3#1171717@ p--p @ p C- @  :%#3#513151#1131676751#1'3#3676751&'&'#11 @@@@@@@`;BY`u3#32##11312###"'&54763311&'#1"'&5476331673#3'1&'11&'&771631%731'&771631&'&' r %  % r ))8HHH0#"  __  "#0IIIH~ __  #"00#"   (   '(  ||`" "|||| ""=M"1131111"33!27654'3&''171675127654'&##5#15167711  .DD.    .DD.  DD  B/DD/B   B/DD/B  K (DD'=KU"1131111"33!27654'3&''171675127654'&##55311#1&567711#  .DD.    .DD.  DD  B/DD/B   B/DD/B  K DD=M"1131111"33!27654'3&''171675127654'&##553111'1&'  .DD.    .DD.  DD  B/DD/B   B/DD/B  K (DD(>M\4711633!2#11112##!"'&54763516771'1&'51"'&551716751#3#351&''11    .DD.   .DD. `DDDD  B/DD/B   B/DD/B  (DD' (DD'  J11111&'5111113312765516767515151&'&'"&'&#"&'&#"&'&#  -2  $        03&;'*` i )P     S4'11&#"1&'514'&#"1'1&#"1316767514'&#"1&'514'&#"1&'5    <  qC]K12      :  k?21K p ?7"1133133676751&'&'#11''111'1&1#(     @6%$+$2." K C     $%6q?,# @B<671167331111##1"'&551'1##&'&'6767336767&'&'##&'&' p9#q ` N"  0P  Pp P /# 0 2      "Y&'11&1&''1&'&1''1&#"1330101676716'&'&1#&7716'&'&1&'' 5 + ?7  qC] -!" R % $  &9    5  k?+     ?KXd471163216367263111##11#1"'&'&''1&76761&'1675716751&'&'1675  !    $%6@*$$H   8p0P     006%$"`  KC``````'=M2111#15147632111#"'&551476347116321#"'&55%'#1'1&767655332##1316767513273271#1&''1&'516767 @ `  @   SSSFG F 88--D>B/ %  @ @ @ @ @      D--. &5 d+P&132765511327711327651&'&1'11331132765513127654'&##1"Z  V  V  vv @  @  S s s     8G671167654'&'&'67311''1#11&'5153#327654'&##1F::$""$::FF::$""$::F`X""" %=0@@@ @@!"<=CC=<"!!"<=CC=<"!h",K RH`pX  @"8!11!#671167!11!1&'&'!!!2#!1"'&54763@@       ->_5#11!151&'&'#1514'&#"1#1514'&#"!!!1!16767131#11&'51#1&'67315167`0  0   `@@ ` 8888  00       88888.?K21113151476321311!151676731514763!!!1!1&'&'67&'#13  0 @ 0 @  8     00     .?_21113151476321311!151676731514763!!!1!1&'&'6'&1'1&11771176''17  0 @ 0 @  1////////     00     q////////.?Q21113151476321311!151676731514763!!!1!1&'&'6'&1'1&177  0 @ 0 @  I_/@p     00     q_/@p  /"11111!167675151&'&151&'&1514'&##@     @ 0P  T?T 0+=471167632#"'&'&5767&'676767553271#"'&5""&&""""&&"")   0'!!!!''!!!!'@)p #EU#3#"13!127716''1&##14'&#"4'11&##151#11#1"113!12765555#1132765ࠠ y0 0   @0 0y @   @ 0 0  0 0 @```` @'''11771617711'&'167  o 7777}2 :|:::}3 O#1113117713167671&'&'!@` {P ] 0F671167654'&'&'5#"'&5514763235#"'&55147632F::$""$::FF::$""$::F     @!"<=CC=<"!!"<=CC=<"!@    4671167654'&'&'3#321##1"'&5514763F::$""$::FF::$""$::F@  @!"<=CC=<"!!"<=CC=<"!`   6?H6711671#15#3#1!1676751&'&'#151&'&'&'6767&'0@@@ )) @ 00 P000 )) 00  000@3AN\6'&1#1"313!127677127654'&##1'1&1#175&'516771&'51675&'5167  ]V 44 V]  QQ=`        ``````````N[7671167632#"'&'&'7&111771632176''1&55167716'&1#"''7676'&'!"<=CC=<"!!"<=CC=<"!       (++( _  F::$""$::FF::$""$::FV  3V II V2    FUa676'&'"1117677111132765514''15117676''1&'#776771'76''1   / #M  2F M/(  5C vv` ]  F+MS Y2^^  g%}}}  X5  @18JY111!167671&'&'!'''1#11'&771672''1376731#1&'55316767&'&'#@@HHH R H*[8))80    @    k****`))```  ):b1111&'&'&'&'67211#"'&54763'67&'&'&'&''6111171611&'&'&'677A4444N   :&'% ( 1)*5(` }ee<<X44AN44   H'&:%w`(5*)1 ( X<  D+     .   ? <'+*A\  ||    |].  III'#"7..%O   k uK1 G***2 @/// (  %('.A*+    9AQ&176''167676'&'&'&'&''67116'16'&'&''1672301%' P i  #$00=3+*!p&11+. '   Z S2 $#00= 0 R  ##!"X"!442"  F  V ##!" %67&'&'1113151!1674''17165&'!\@v>>`@@!Rdm777161151#1'1'1&#"7'&'&76771&#"11311767671767677676'&''%1331276551#&'67%5331276551&'#67&'C```  c  H!444TH\     P    P kOOO   N /}(((C0S  {R  +777111#"''157"11!1676751&''1&#@0u u0     +8DQ]111!167671&'&'!3#3#1&'6767'676'&'%&'167516751&'&'1675` p@@@""   P""`$$$$p@@p@@@@@+8FTb111!167671&'&'!3#3#1&'6767'676'&'%3#3#1&'673#3#1&'673#3#1&'67@@P@@@""   @""`$$$$ @@/<%&'11&##1"32767%671167632#"'&'&'676'&'$@$$%++%$q!"<=CC=<"!!"<=CC=<"!))))@F::$""$::FF::$""$::F#$$##$$#+8F111!167671&'&'!3#3#1&'6767'676'&'73#3#1&'67@`@@@""   ````""`$$$$@ 1>KXe!!!&'&'!1!167671!67116731#1&'7&'&7676731#1&'6731#1&'6731#1&'@@@@v p$$$$`       @@0D[11167674'&'51&'&'67116710101&'&'67670101511&'&'6751671 ""  p 00 ()==)(   "" 00  0%3=)(()=3%  !  !0D[11167674'&'51&'&'67116710101&'&'67670101511&'&'6751671 ""  p 00 ()==)(   "" 00  0%3=)(()=3%  !  !0D[11167674'&'51&'&'67116710101&'&'67670101511&'&'6751671 ""  p 00 ()==)(   "" 00  0%3=)(()=3%  ! ss !0D[11167674'&'51&'&'67116710101&'&'67670101511&'&'6751671 ""  p 00 ()==)(   "" 00  0%3=)(()=3%  ! 33 !0DQ6711671&'&'47675711101016767&'&'010151&'&'676'&'p   "" 00 ()==)( 0  P  ""p 0%3=)(()=3%0 `3FYl4711632117716'&1&'&'1&'1327652711654'&#"34'11&#"3276552711654'&#"34'11&#"3276552711654'&#"34'11&#"3276572711654'&#"3@   !)+    @     @     @     <  !+ <   @     @     @     7\67217716'&&'"'1&#1"3!127654'&#!15513276551!1132765516751!`  h  !  @    @s  h !   ,(  (,.Ojw%671165&'&'1&'&'6767675167'&'&'67&'&'&'6767'611#"'&'&'&'67635&'&767?%21KK12%=%%32??23%%= )) 1()==)(1]     L&'/K1221K/'&67F?2332?F76& ,)), *D=)(()=D* )))) /111!167671&'&'!!!!2#!1"'&54763@ @@  @@    7"113!127654'&#!   @   'AX#3#1#1516767311#151316751&'671167!11!1&'&'1133127654'&##1"@"""P@   """@   :111!167671&'&'!6171611''11'&771'1&7@@O////////@////////&'1#1311#1311#131167513116751311675167673167&'#1513167&'#1513167&'#1&'&'51&'1#151&'1#153#321##1"'&5514763#3#1315((((((88((((((88  (88((((((88(((((h   21117161171716171611''11171611''11''1'111''11#"'&5511'&7715111'&7711'&'&76771'1&76171'11'&771'1&'&76761'1&761151'1&761514763 1=  D<=D  =1  1F#C #$ C#F1 1F$B ## C#F1 7&5676767"'1#"'&5477,+1)$$)" !)$$)1+, &^g&11111311327655151514'&#&'"11327655167674''1&#1&''1&'1&'51111151    "  "     0&'Gp p   # #   :7#3#&'516761676'&'&547632327654'&#"1#1  *,9989,,,,9999, 1@@1//1?@1) w *,,,9999,,, //1@@1/.) 0=JW67311312#!1"'&54763317!!!1!1&'&'16751&'316751&'316751&' x `  `g```   n@@0b631121310101316751&'&1&'&767675111771767676'&'&#"'716'&'#111#11?@1) x *,9989,%   *,9989,%  1?@1) x1/.)  *,,%.  !x *,,%.  "/.) 7E"1133116767&'71654'&#"1&'513127654'&##5&'5167 L11;;XX;;  +9 0  "88PX;;;;X@1 # "  'U'1#"'&551#1"'&5514763315147632'#3#"13312##1&'&'16767312#z{{{ {     @@@ @ @))@ V{{{  { > @ >   ))  'U'1#"'&551#1"'&55147633151476323#3276514'&##1"'&54763311#1"'&54763{{{ {     @@@ @ @))@ V{{{  { > @ >   ))  :%3#36751&'&1&'&767654'&#"#"'&54763213 *,9989,,,,9999, 1@@1//1?@1) x *,,,9999,,, //1@@1/.) BUh{&#1#1!16767&'&'67&'&'#167&'&'#165&'&'211#"'&547634711632#"'&5&'&'&56731 "p$M  `   @))  "$$%     l    @5H`111!1676751&'&'!'###&'&771632171632'4711632#"'&5'&'1!167&'!1&'&'5```` @ 8    '&:@%k  P T   :&'%1O]%77'1'1'11111771677177171677113711111717171654''1&#"7'&7716 ">" # x O  ">" (0 ">" y $N } ">" ' $7171654''1&#"717716771'k1111(G# x1111(Gx #G'111'111'1'1'171632&1'&77163211111111'&7716771'(((4`4ff `Jf I (((4`4`ff `I fI D"71327716'&'#114'&##1"1#1   H @ Hq    c"7''1&5477161!121#!11      "   H @ Hc"%771654''1&1!1"13!11O    "   H @ HC"6''1&#"1311331276513167>   H @ H      @!(:N671167311331111#1&'&'#3#51'1'17163277111'&77167 _  G  G <  ^ <@l  G G <  Y#3#177111'1&131676''17111316751&'&1'171176751&'#111'1716'&'Ȑ (OO(  (OO(  (OO(  (OO(  (OO(  (OO(  (OO(  (OO( $7E11#11!167671&'&'#1&'&'211#"'&547633#3#1&'67  &%    P@@   <D+%654''1&1#151&'&117675131177p    pp    p h 88 h h 88 h+&#"1311#11327716'&'#15131676'' h 88 h h 88 hp    pp    p>116767654'&'&'7#"''1&56731514763312131F::$""$::FF::$""$::Fykkkk:   :!"<=CC=<"!!"<=CC=<"!dddd ` ` >%&'11&'&#"3276767''&547716313121##11"'!"<=CC=<"!!"<=CC=<"!cccc ` ` F::$""$::FF::$""$::Fykkkk:   :>7113276767&'&'&#"%'1#&'51#1"'&55147633151672!"<=CC=<"!!"<=CC=<"!'dddd ` ` F::$""$::FF::$""$::Fykkkk:   :>671167654'&'&'776321#11##1"'&551#1&'47F::$""$::FF::$""$::Fykkkk:   :@!"<=CC=<"!!"<=CC=<"!'dddd ` ` S11327711767514'&##111!16767514'&#"1!1&'1673127654'&##` * ) ""@"  p p) *  """p p@  ;111!1&'&'16767!55&'#1111327711367@@!B$B! @牉 !B$B!!C!!!5167611'&'51!1"'&54763211#!11''1&5477161! @@` `  ` `@`@ ` `@   @ ` `@*U711327656767311771654''1&1#14'11&#"#151&'&1176751316767  )@ @D--  )@ @D-- )  @ @ --D@ )  @ @ --D ` 6%676'&'711&'&'#1"'&54763316767312##@---- ++;;++   ++;;++  p'((''(('08#$$#8  8#$$#8  IR[&'67671165&'&'167674'&'513136767&'&'"#1&'&'&'67%67&'P  ""  "" )7W "" W& a "" "" W "" &@5>111311#1"3!127654'&##1'13167671&'&'!5!151!@ E  E @@    @:6331211#"'1&7711121037167&''1716'&1'1&u p   p&:9ZZ (`  `aac.%1#"''1&76731514'&##1"'&551476331131^   X P P6%$Xq     $%6c.6''1&#"1311##1"13316767513167^   X P P6%$X      $%6 @;67116713276551&'&'1#11!1676751&'&'#15`""  ()==)(@ 0""0 0=)(()=00)6711671167&'&'327&'&767''66RR66''  $$$$3!87;;-R6666R-;;78! s  p/d56767#1&'673151#1&'673151#1&'6731&'&'5&'&'51&'11#13367&'#151676751&'`))PPPPPP))$%66%$+*B0HH0B*+`))  ))6%$$%6((D00 "" 00D(p,5671167311#1&'&'4'11&#"32765#3#131   P  @p'1113167671&'&'#3#3#1&'67PP@@@@Pp&/671167311#1&'&'3167&'#1#3#131@@@@#-7A\w111!167671&'&'!#3#51'55316711671#7&'11&'31471167632#"'&'&571#13367&'#151&'#1@@@@@@@@@@@L@@@@@@@00D!961'&771&'&567716117771611"'&'Y  0X ( 1\\\\(` OGF: 0 z:HHQ `(' eHHH 1 ( X-&=&'11&'!11!16767676'&'67116731##1"'&5  0W $$$$  0131#&'676767&'&'#11''1&547716pK12  )`  @21K8%%  )@   +21'&'&'&747677163676765'11 /.VV./ D'&P3EEAB+ +BAEE3PCz#669:.J,5671167!11!1&'&'4'11&#"32765!!!1!1@   @@  @'111!167671&'&'!3#3#1&'67@@p````P@-671167!111!1&'&'516767&'&'5@@@ "" @@ "" @0%271167654'&'&#"3113!12765&'&'#'!!!!''!!!!'_D.-  -.D""&&""""&&"" -.D D.-:111!167671&'&'!6171611''11'&771'1&7@o////////@////////96111#1&'51676173#31''11''1&771'1&767 W'  'W 'W W'  W'  'W 'W W' ;3#31''11''1&771'1&767#3#&'516761716111X 'W W'  'W W'  'W W'  'W W'  -:"11117167716771654''1&#&'&767%176''1& I %3&t)X'((''(('@@t%3% I )P----!@@P]j7#"'676727654'2323&#"3632&547&'""#"#&'&'&'4532765&'77676'&&7676'?::UH9:"" ::UH9:"" : E! ;E! ; U:: "":9HU:: "":9H !E ;K !E ; +8AIW'674'367'7"171&'"'71'165&'11672&#16767''''127&567WUUU#B1,;*U ,=Fc>=4H>=4H;*U,#B1U===Ed ,UUU*;,1B#UWH4=> cF=,& cF=, #U1B5*;,U===>H4-@S671167654'&'&'211#"'&547634711632#"'&5'211#"'&54763F::$""$::FF::$""$::F     @  @!"<=CC=<"!!"<=CC=<"!     @   ARc&'1#1311#11#131131'13167&'#17165&'#1513167&'#15731674''1#!731674''1#'51131'1716551&'#11#151&'#11#151&'#1671#154!!4`++++ ++++ ~P  TT p::::::::444 HH 4` @->"11131516767&'1'&771&'674'&##7!1674''1# $&&d j&$ @P)))) !:;J#  #80c j:! P)))  )bkt}111!167671&'&'!531513113151311#11311#11311#151#11#151#11#1513151#1513151#15133#351#155#1133#3#131513#351#1@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@@R2111312##113121!1'1&547633151#1"'&547633151476377!11!1&'47   MM   ))) )   0  0   '))))  09I711771677161!1716551&'&'#167&'!1674''1!1`  2 @66R ar))   % W R66  D  ))0'77671165&'&'#1"131'1674'&##31674''1#1 ,,     )),, pp   )) 7>O&'&76767676732761#!'1&767632767111111!!!1!1&'477   z,,  kk  z  ))%%   P)  )9M_5567311316751673113167516731111!171'1&53#367514'&#"177!11!1&'47 @ @ @ 33   )))@)(((( && `0 0))))  7ox471163312111##1"'&551#1"'&551"'&54763514763315!531212#1##11##1"'&551515147633125#1513`                   @ @ @  @ @@@@ @  @ @ @ @@@@ !.;H1676767'6'&'&''761''1&761''1&761''1&7b- b- WD߽WD7 @ @ 0 @ @ 0 @ @ 'N-2'N-2WEݽWEK @ @ 0 @ @ 0 @ @ '8Kt11#1&'&'676711#327674'&'327654'&#711#327654'&471163332##11#"'&551&'#1"'&5''66RR66     4    q     @@    3)**)3R6666RA    2            '%&'11&'6767671&'&'5167mHHHHmmHHHHm&HHmmHH&OqqO))))))@ >K1111#1'151672171632'#1&'47716'&1'67716&'&7677 "l " vvv/+<3 "1C---- " l" vvvC1* q 1#/u'((''(('!!!1!1@HFa%"11'13171676&'%'"##1&''1&#1"''1&56771674''1&'5147211#"'&'&5476763&<,9999,3 !,5% :   C  $o   <,,3CC? #$  C   : &5"    *7DQ%6'&''&'677'&'11&'6323&''&56767&'6767&'677#()6Q32 KRSH$:=@A>.(.E$%B=I//%&>F:&&$..P0M= AKKH#--4PGF4BBY#0)$27$ 7E;;-.KJW ##;;I K<;!Z;E$55>+SED&w')%- !S\enw4'11&#"1&'514'&#"1'1&#"1316767514'&#"1&'514'&#"1&'567&'&'67767&'&'6767&''&'67    <  qC]K12    0P0p0  :  k?21K p P0 `+4=FO%3#3676751&'&'#1!!!1!1!111311#67&'7&'6767&'7&'67```` ``xxx @@@px '73151#13#3'1&'#1!!!1!1676753333r3r@@@eeeee @$Jp#3#131676751&'&'#11#1&'511131676751&'&'#11#1&'51#3#3676751&'&'#11#1&'51#1"13(((  (0(0( (0( pp PPPPPP 7_3#31#151675#11!167671&'&'#151&'&'#167311311#11#1&'51#1&'51673158@@` 00 00((((((0 00 09%''&''1&#"1167674'&'&'477167716321u4oo4 76QQ67 [)))  *gg"P6666P"1((6)  )6F;KV6711671#15#567675117676''1&'&51&'&'&71167611'#110171"@  `@ 00 ,,'',,(* 00 )  CPA0  pp0  0'--('!20  0@ b8_$7K11#11!167671&'&'#1&'&'211#"'&547637''1&761716  &%    q@/o@@   р@/o$7@NWd11#11!167671&'&'#1&'&'211#"'&5476367&'73#3#1&'6767&'36731#1&'  &%    xhhX@@   pB GS\enw676'&'671167131517676'&'&'&'&'47&'00"'7!167&'!767&'&'67'&'6767&' 2222 $$  # ;G[E    7hp*,,**,,*  mm      [8`\fpv2111111111131&'71716767#"'&5!1#"'&5676767&'&'&'47632!14763#3#!1&'3#367!167# ,6 v&    ,66,  @ M   8 v -$$)$  $$-  -$$)$$)$$-  0B.P47116331217161&'&'671#1"'&5&7116771171'171611'&'' I\.  ()#\I  .=. 1  1 #C D()0 g == 1 Eq"1133113167674'3167674'3127654'&#!1&'1&'&'#5!1676751&'&'#11''11'&551#1  "    C 0" @  ` '' `   "       "P      $L111!167671#1"'&551#3531'67311311#11#1&'51#1&'5167315@ ` 00 00 0 00 0 CJ111312171632131#1"''11#"''1#11!167671#1"'&551#3531'`p 2 FP 2 f  #c 7 #c 7 @,T111311#3!11!6711671&'&'#11367311311#11#1&'51#1&'5167315@ @@  00 00@@@@@00 00 0>671167654'&'&'51&'51#11&'51671315167F::$""$::FF::$""$::Fp@!"<=CC=<"!!"<=CC=<"!hhhhhPPPP@CTa3#321##1"'&55147633#3131676751311!1&'&'167673167&'&'#17676'&'@@@ @  ` @p vp$$$$ @ @ @0  0@  U  C[76767!111##1&'&'71#11311316751316751&'#151&'##1&'&'516713`:00 00 :&'%`:0 00 0'&:%1:C7"113311#1"33!27654'&##1513127654'&##3#31#1533#31#15    @   @`ࠠ  @   @  @@@@@@&;N1113151&'&'6711671&'&'5#11''1&74767&'&'676361p ` p 00  00 +  #,D--<#,D--  ` pp 00  00  0  --D,#<--D,#  H471163!121#!1"'&55!!!1#1&'&'513167&'#1513167&'#1513167&'#15 @  @@pppppp    ` @@@*T471163!121#!1"'&55!!!1#1&'&'5#11311316751316751&'#151&'#1 @  @@00 00     `@p000 00 0)gt'31#1"''11"''1#1&'673121716763#3176771311#"'&551#!1#"'&5147632131514763#&'&767)))\h / ){ .    R)    ----666 d  = $a  )     '((''(('aly111#133##33##33#1167673167673127654'�''1&##151&'&'!5#15131&'&767676'&'p 0000))))  M3 3M   0))))  @ M0 `M0  %Ken511#"'&5514''1&'514763255&''1&'5147632111#"'&5671167!121#!1&'&'5353151#%2111#"'&551476332111#"'&5514763)   <  )   <  ` ࠠ   `   ;+!.   =V   ;+!.   =V   `  @ ` ` ` ` %\'1''111''1'1&76171'1&7677210111121##11'&771514771176''171176'' &7HH7&===88Y99+9 9*9 9 &7HH7&===8899Y,9 9*9 9-;%67&'&'176''1&67!!!67676'56'&'&'!f--D1& / --D1& +*;;*+  +*;;*+ &1D-- / &1D--J7####7 8####8:7554771176''171176''171176''171671##11'&77`9 9*9 9*9 9.+,YYYBYYY9 9*9 9*9 9.,+YY+4 "111316711327654''1'1'7711#W )' ` 3`f () ` 3` )JS471163332#1&'&'1"'&5#3#13157471163332#1&'&'1"'&5#3#1315 8h "" 0000 8h "" 0000  ""0    ""0  -;DM4767%1611#1&'14'&#!1"1#1&'!!!&'51!11%55!11!555!11!    0  0P(==kk 88p@@@@`PPPP>U471167632#"'&'&5%&'11&#"#11!167671&'&'#4'716'&132765""""##))##88` " !  ####p@ O N  *}471163!12#12#!1"'&547631"'&51#1311#1311'1&##1"1316771654'&##1"1513167&'#1513167&'#151&'&'6767&'   @  PPpp3 x 3ppPP0P    @   0G    G0  uD63171211''11''1&'&77'77111''1&'&5511767713; *SS*777    7  T .. TV[[[$ 33 $[6I\o%6711671167&'&'&'#01111111111367673'211#"'&547633211#"'&547634711632#"'&5H9:"""":9HH9:""/ ,&#08    `   //::////:E4%        ?&176''167&'&'&''#0111111111136767327' P v="":9HhGjU/ ,&#0880 0 \9P://6SW  %*E4% Q671167!111!151&'&'567631##1"'&5!1##1"'&55167672113!515@$%66%$    @      6%$$%6"00"p!      !0 0i%#"'0141&'&'6767"11#&'&'&1111167516767&'&'51&'&7&763276'&'51&'3#3#113351#167311!1&'&'516767G"%%".!8;;XX;;8 ,G        *HH+  `  , ":VX;;;;XV:!@    ' ' @  @ PY51&'&'&5111111&'&'&'&'"12771316767517165&'#17&'67)%#  ,-((  )(>LJD-- d"P_.A@/ ""8 ""0:*) &=--D- "B3@%67116'&'&1#1&'673327654'&###"1#1"1333277%0"141050110  wy@ @^-#-% ,$8   X  $ @ ^BR\&511476321716321#"''111###"'&5514763317163332###31716111#10103e f  $- %-#-NP @yw 7g g ^ @ $  X  0B[5'&#""10101311&'51&'"#&#&#&763276565116'&''1&'&'67675167111###"'&5514763317163332###31716111#101038          $- %-#-NP @yw   "    #   ^ @ $  X  0BLV63211&'&'51477111###"'&5514763317163332###31716111#10103B))C$  $- %-#-NP @yw `))` ^ @ $  X  0C4'11&#"1111331676751&''111'1'1&#"11''1&551515!5111'&'&77171654'&#"111111312771655151514'&#"P  dC    33    Cd  X 8@f'd O.!   3(P((((P(3   !.O d'f@8  v:%571654''1&#"1&##1111327655101015133010131'5&'&'511113277123033127674'3127674'676511&'&'0101# FN(p  "JN%    xEN)x H"8888w9IN& +f777161131676751&'&'##'1'1&#"7'&'&76771&#"1#11311767671767677676'&''C```  c  *  LH!444THP  l\  kOOO   N   /}(((C0  S  {U45&'&'311#1"'131&547673111316767514'71316'&'&'311&##1513&&22&&o xD#$  `  $#Dx pN2//2N0))--) `  ` )--))0 w676'&'511'&''1'1&5516767115147633121717167111'&'&77167715111##1"#"'&''1&''7711'&'&7&'&767''&''17P@3  O&/  0&O  3 <; 0001%   N000 %1  AAA3 [ VOXGL LGXOV [ 3A  www1^  www  ^1@s|5&##1"4545676723673113121##11##1"'&551#11##1"'&551&'#1&'&'676731#1316767633&'67))-         6  -@`)) !7 ` @   @)G-!! @O%111'111'16767117165514''1&'#1111111111771676''''1177M58U(*L(&8S\6 XSSS_ 7L}:  =]%<#!5$@`i  `X```h  RHfy1111'#1"331!167673127654'&##1&'&'676731&'&'6767111'&'&'&'676774'11&#"32765%2711654'&#"3] `))   `))( ))u ))       `  ))   ))))w ))     511&'67673124711633111#"'&551&'&'&'66T 633@   ?23  ?23W== Q:4 @ 32?  32?2L2111!12#!11#"'&51#1"'&5476331514763!!!21#!1"'&5514763` `     `      `     5HY671167654'&'&''1167676&'&'&76'6711632#"'&''&7632'&#"F::$""$::FF::$""$::F\!! ))     $$ @!"<=CC=<"!!"<=CC=<"!    v      @#>K%671165&'&'&'!127654'&##211#"'&'&5476763&'&767}32??2332?@   @   ))/?2332??23     `$$$$+Q&'&'1'&'&767%1167673&'&767%&711677117716''171611'&'' 0/   @@ .. )  *pp0 .d W"p    M M  * CNat111116767674'3367674'3127655151514''1&'#151&'&'!#3#51312211#"'&547634711632#"'&5'211#"'&54763@"))"""" ;1 iii129     `  P"""" @  G0@=p        -=&176''117671&'&11111'151&'&'#1'1!167' P W` Kpw% 0 D   @ ;d''11:67116331211312###"'&547633151&'&773#3'1#1  40 PP 048  7)* d   d *)7c@@*&176''16767&'&''#3#'1#13!' P %()=5'& ;D.-  0 "",=)( 2n-.D &@a&'11&'167676765514'&'5#1&'&'51676731''&#"11113277171654''113315147633121312765&'&'&'13151&'67&'s''22''   ''22''  #) )  L3  b  b  30??0? ``++ @ ++ @ 0))  ,,9  @ @  9,,""00 1E471167632#"'&'&567116731#!1"'&57''1&761716`""""`23K\K32  |  q@/o@####K3223K   1@/o0K^211#"'&'&54767633#32!1"'&56767471167632#"'&'&5713167&'#151&'####.\\\ #  23K""&&""""&&""0 """" -%&  K32@'!!!!''!!!!'P@0r<211#"'&'&54767633#3271!1"'&56767%676321771611''1&1#"'&'51&'&1'&'&'&771654''1&767676176754'&765####.\\\     23K                \""""   K32V                   2DV7271167654'&'&#"3113!1&7716771&'#% "1171654''17716771'1####.K32  % (1J\  G  < G""""023K  < (0D G   < G1K\471167632#"'&'&567116731#!1"'&5#3#65514'&'012331#&'674'67`""""`23K\K32  |  a !>D.- 0&0  0@####K3223K   .''-.D  )6)! 00 /L6111&'&'51'111##1"'&77151&'677617716#!1"'&56767M$%66%$0 k G G 2 ~ 2(96%$$%69 AOOG( L L ))7 7))0Ae7271167654'&'&#"3113!1&55145&'#%2111#15147635"13312765514'3&'&'####.K32  k 0B\^ @ P  """"""023K  )@ 00 000   0""1?471167632#"'&'&567116731#!1"'&53#3#1&'67`""""`23K\K32  |  ؐ@####K3223K   .MY7&'11&'&5676767&'&'&'436763671167617716#!1"'&53167&'#, !      &6%$$%6%$; > > ;$%  |  '      $%66%$?./S S/.?   0JT7271167654'&'&#"3113!123&'&'&##%7767676'&''1&1151####.K32  9\5xxx 6 6 x h2_""""023K  ,78.N000!))&&&&))!0V()*&)&176'%16767&'&''113!127%' P *$%66$$H//   0  !"-6%$$#5x21I  y2NW7271167654'&'&#"3113!167'1&551&##7"111132771654''1&##67&'####.K32   d\ kIkS""""023K   d!!P SkIkPT1132767654'&'&#"'1'1&331"30133"301312765&'&'&1'1716'&'##`""""_!$ 6!" v "!6 $!  @####| *+9 9+* | .Cu 676'&'!676'&'310101&'47&##167676765&'&'&'#1!1&551&'1'&'&'5111'111#1&'&767714545'7#3#"1675147676321716&'&'6'&''1&'&1'&'51&'&#"1''1&1111771613276751676176771676''1&5477676'&'----p----)*.@%)))Ah8&&,   ***      -\           '((''((''((''(('%; .)))< &&8       ,                      9@W^u67116'&'&1&'1771133127654'&##11677771#6711676''1&#1%'#171167676''1&#1  q."{    ! ~RHHHHH0#"  __  "#0IIIH~ #"00#"  `_  %%") -  '"*||||`" #\||||"" 9@W^u&'11&76761671''11##1"'&54763311&''''13&'11&'&771631%731'11&'&'&771631v  q."z    ! ~RHHHHH0#"  __  "#0IIIH~ #"00#"  __  %%") -  '"*||||`" "\||||"" 7@Zm6711673!1#1311#1311#1311!1'1#1&'&'5''#113!!!1!1&'&'5167672711654'&#"3@V |jb W FR         @@@`      `   @"E7116514'&'&'"176763367116727651&'&'&#17 ,&!!  !L!  !!&,  y     r  @1Jc|'&'&547676%'&'&7654'&76761#"'&51&'6767''&'&547676%'&'&7654'&7676P         %   '--'  2::2  2::2  '--'  l% )%3  $))$  $))$    @=65114'&#"1'1&#1131674''17''&17716131676'7 " l"vvvC1" 3=+/ "l "vvv/#1 q *1C@?111311!11311&'&'!5#1"3!127654'&##1514'&##1"`@@          1L^671167!11#1&'315147633121311!11211#"'&'&54767633#3!1&'6767`#d @ @#  6668&&&&8'    1 @   &&88&&7EU&'1#131111315167671311&''1513167&'#151315167116751&''113X  q``q   Pg7 gP.D``D.\ 8 \8CTx&'&'"'1&'6767632010101011111101#&'&'&'676767&'676710145""'&'&'5167676767431135551676714567671&'&'51%.M=W %66RR66/'(&('0\8%##9+!+ %8\0'(%=WW=  7W=66RR66=Wp""Q  O! # ` #   # p #""# -H]7671167632#"'&'&'"'11&547632#'1132767654'&'&#"'676767&'"67!"<=CC=<"!!"<=CC=<"!  `   @+,7" F::$""$::FF::$""$::F     7,+ "~@I111177131176''1312303176''167675151716'&'&##1&'&'67%  J/ ')/ *>&'Q 2*% 9q _q f22C@ @@M674'&#"1''1654'&#"3012113!1276771030127654'&#"1'&''5  9 Y  --  Y 9V   s  G      G  s "+4=Fbk "1132771654''67&''&'67&'677&'67'&'671131676751&'&'#117&'67Kh`rtPt"x,?Rex111!167671&'&'!211#"'&547634711632#"'&57211#"'&5476374711632#"'&5211#"'&54763@@@       @     @`        @     ,?Re671167!11!1&'&'4'11&#"327652711654'&#"374'11&#"327652711654'&#"3@          `@@          ,111!167671&'&'!211#"'&54763@@  @   ,?Rex671167!11!1&'&'4'11&#"327652711654'&#"34'11&#"3276572711654'&#"34'11&#"327652711654'&#"3@               `@@     @     @     ,?R111!167671&'&'!211#"'&547634711632#"'&5211#"'&54763@@@  @     @`     @   ,?671167!11!1&'&'4'11&#"32765'2711654'&#"3@`     `@      /&'&767&'&76772711654'&#!1"3!  ``       @%8671167!11312##!"'&54763312711654'&#"3`@ pp @         @.M4'&11#1"3335111#"'&54763273#3133127654'&##11&'&'#1@   @@  ```` @  ` -       @@ A%%77131676'&'&'477167716'&'#1&'47716765&''1&'117169DL? Q p,-@@-h$ 9( " %@-,,h$//37 @^g11111312##1"''16'&'&#"177111116761312#!1&'&'676767676767&'p U \3 @ n !)) J J%Z &&AAR "S\  oF G%  TEE,,hYk6711673113116751&'&551'1&7611111&'&'514'&##112#!1"'&547635316751&'#1 %  M   @% @  M      ````@16710113111111111011713167111&'&11111111131070307676767'1&'"1'&7716321111#1&'&''1#11#1&'&'515151474771676321''1&#531276771&'&'0155&'&'0#1316767w& /2!  (   2/ &  , 0,. & .,0 ,  7 , $%%$ , p         )0 .. 0)   +++  .  *+++  .  3&'11&767611'&'&76771'211#!1"'&54763!4  @  l  b    bb   @Ml471163!12##11311###&''1&''1&''1&731213151#1"'&53#351&'&'#1111!1"'&54763!12771632   D-- @ H &Р ) &5    @--D@ _7\ 3@  )i $    `%8K7671167171671&''11&'&'5''&'16773'3676751&'&'")(><+HH+<>())(><+HH+<>()HHH""""HZHHH""""H>()*HH*)(>>())II))(>HHH""HHHH""H@<E%6711673127176751&'&'#1&'&'&'1675132716751677&'67#8U $%68,7R66,< z  6%$ 66R6+,B.)3 367116'&'&117676'&''17"113!127654'&#!  @    b    bb   @%^t1111!151&'&'676751&'&'!!!!1331516713151671315167131516713127655%5#"'&5514763235#"'&5514763235#"'&55147632@  @  @@ 0```0         GG  @     @@@@ @ @@@ @ @@@ @ Em&176''16751&'11'151#1'1633151#1&'673151#1&'6731&'&'1'#&'&'51'111#13367&'#15167'' P 9#PPPPP))?6%$/+*B0HH0+ 0 |(1( -  ))6$%6 %(D00 """@!4>HR\7676767671&'&'&&'11&'6767#11#157115135#16767'3#31&'&'ABAA<<<;AABA<<<; """"@@@@@@@@O5   5   ))))@@@@@@@!+5?I\w7676767671&'&'&#3#51'55316711671#7&'11&'3111&'&'6767'1#13367&'#151&'#1ABAA<<<;AABA<<<;@@@@@@@@))))O5   5   @@@@@@`0  00  000D@'4F111!167671&'&'!3#3#1&'6767!1!1&'%3#31#1&'5167@@0`PPPPp00@'4111!167671&'&'!3#3#1&'676731#1&''5'&'"11211&'51&'1111&'&763327656'&''101&'&'67675167@@\        p    N111312##11312##11'&'&771#1"'&547633171#1"'&547633171676r *? i@ A *? j@ A  >  `  b  >  `  b 0CVi|%111##1"#&'&'&'6767674'11&#"3276552711654'&#"374'11&#"327652711654'&#"3b  H9:"""":9HH9:""        `   "":9HH9:"""":9H   `   `  `   (H111!167671&'&'!3#327654'&##1#3#1#"'&55151476331@@000 00000  H))@  @@  @x ))@Q67116731131516767311#1&'&'51#111311#1&'&'5145'1#1&'&'5 `  `  ` P`  ` P` p    `  k `  `k `4@MY61716171617161''11''11''11'&'1673167&'#3167&'#173167&'# ((((((    ((((((   R "" "" "" 0 "" "" "" p(4@LYfx2111311!1&'&'16767315147633167&'#33167&'#33167&'#'&'&767676'&'%3#31#1&'&'516767!111#1513@ xx p  `  `          @@   (H `  ` A#11"''1&54771176''171176''171176''171176''1716321\30 0*0 0*0 0*0 03\.\30 0*0 0*0 0*0 03\`1133!676751&'&'#11&'51#11&'51#11&'51#1&'673151#1&'673151#1&'673151&'&'#11101 `@  0@@PPPPPP `   ` PPPPPP@@0  `@@K711!1676751&'&'#11&'51#11&'51#11&'51#11&'51#11&'51#1    @@@@@@ p   PPPPPPPPPP A671167311#1311#1311#1311#1311#1&'&'  PPPPPPPP    0@@@0  -?Oaq~&1#113151676713167671&'&'#1'3#31#1&'516767311#1&'53#31#1&'516767311#1&'5%676'&'713167&'#151&'Rv    v    p    *,,**,,*X  [  `` @ [@@@@p@@@@22220 1&111713127716''7132771654'&#"h V V6 P (ppp @ p P 6V  V h(ppp @ p 1Rc111113276767&'&'&#113151#12711671167&'&'&##1%113151#1!%%##))$#341 143#$))##%%!  ((``(( `@MZ%671167&'&'&'011131516713151671316767510501%676'&'%&'&767,"":9HH9:"", 0@0   $$$$1--6?2332?5.-@ 0000 @$$$$@  /Jcp'11&'&'67''311#3#36751&'#1'167'671167654'&'&'3167&'&'#1&'&'''#113dOOO`\0?R66# S3 ###|0?R66"0mF::$""$::FF::$""$::F    *```v/OOO`]"66R?0 @|#66R?0/!"<=CC=<"!!"<=CC=<"!  ```@9#M''&#!1"1367676727676'111#"'1!151#"'11&'11!167675151$::::*))((()*0 @X[[[ [%%%%%%@@6E!!!27654''1&'!113513167675151#11#151#!327651#%66 LtL   @@  @  rr  P  P -D471163!12#!1"'&5471163!12#!1"'&511#!1"'&54763!12   @      `      7671167632#"'&'&'%&1'1&11'1&11'1&117711177111771176''171176''171176''1716'&1'1716'&1'1716'7711'7711'77711'77'171!"<=CC=<"!!"<=CC=<"!9 "" !-8 9." "" ".9 8-! "" "-9 8-" "" "-8 9-" ------D------D------------F::$""$::FF::$""$::F "" ".9 8-" "" "-9 8-" "" "-8 9-" "" !-8 9." ------D------D------D------ Nt53151&'#155676731131211#1514'&#"1#1514'&#"1#15147716335531327653132765311!1&'&'04   4   h(((((((((4\     \4@@@  @=67676731211''11#1&'&'511'&''1&76771633  !!  "  8 43 8  ~"   i  @ ++ @  iB Vm676'&'#11"11'&'&771677163211''1&''1111'&''1'1&7777111#"'&5477!  3#"   2  G9(= <     5%  A6 \  XN!@>>>-$ > ;)<111!1676751&'&'!1&'67!127654'&#!211#"'&54763@p `      3Pk7671167632#"'&'&'6'&'&'7676327'27116545176''1&1374'716'&177132767!"<=CC=<"!!"<=CC=<"!S    `   `   F::$""$::FF::$""$::F     |          ="113!127654'&#!"1133351676713327654'&#1!1   @ @@))@@ @    ))   #4CJQlt|671167!321#12##!&'&'113!151!1"7''&'&'31767315#1&'4'11&'&#"32767653#3&'7#3#67766#16767)    )@   ? *  $$  N"""" $  $ 9 ? `)  @  )@ @  ##  &++&R####&+ +&L ## _l61371211111111#'1"1''1&#1"''1&''1&5714''1&77165'147716771631277&'&7677721371011''11'&7''67714112771431''11#&'              b'((''(('+++ )% !8 %%%) + 8!                ----ggg$ Y 1=YY=> ! ':M`&1111177167716''1&''1&''211#"'&547634711632#"'&57211#"'&54763"J$<"S"J$<"S'  @     (L"R"; (L!S":      @    0CVi&'11&1111177167716'11&'&'&'&'&'&'211#"'&547634711632#"'&57211#"'&54763 "J$<"S"J$'  *1  @      (L"R"; (L! & )t     @   %K4'11&#"1#1"33113151#11132765513127654'&##11&'&'#1131           @`@   @ 3@MV_hqz111!167671&'&'!3#321##1"'&551476367!1!1&'!6731#1&'%&'6767&'7&'6767&'7&'67@    @0P0P@ @ @ P'Hi671167654'&'&'5&'&767'6171611''11'&771'1&736171611''11'&771'1&7F::$""$::FF::$""$::F$$$$ %% $$ %% $$ %% $$ %% $$ @!"<=CC=<"!!"<=CC=<"!   $$ %% $$ %% $$ %% $$ %% J\o1'11111132767676"'11'&5514771&'&767671&567676711''1&''2711654'&#"3` 5$44D $6-- (::E508 8< F ))1(,8 (u  `['Yv '  2b  7 h  x))!L 7  F   3W6'&1&#"1516715167167516716751&'77771&'&'&7&767632 i4>mHHE2>>2ELD@@@ o =ee= >?/:  K !  845& .==<* $2@t111!167671#1"'&551#3531'3#3#1&'673#3#1&'67#1&'6731677167163131#1"''1&#"1#&''1@ @@@@@@@@6 #   6@      @@  2'     8!$@111!167671#1"'&551#3531'57161''1&7615167@ (HH fffHHfG'@G6711673113311#1311!1&'&'5531'1&7611'&771#5#3#51 n'PP'n p000'PP'Ѐ5@G6711673113311!1&'&'513117716''1&1#155#1&'673%#3#51 'PP'hh p'PP'000$2@Zcq111!167671#1"'&551#3531'3#3#1&'673#3#1&'673#321##1"'&551476353151#3#3#1&'67@ @@@@@@@@  @@@@ @@` @ @ @@@@$1>111!167671#1"'&551#3531'6731#1&'6731#1&'1'&#"111111011&'51&'1111&'&7601111111227654'&''111&'&'67675167@ @@@@        P@H      $^h111!167671#1"'&551#3531'3#3171611''11'&771'1&'01#11&'51516767&'#113@ HHH +" "" !AH44 (  <,@PP(@_fx111!16767511"##1"''1&#"1#&''11#1&'6731677167163131&771677151#1"'&551#3531' "1171654''17716771'1@<@     #     _ &  G  < G   8!  2'  < ^,  G   < G$>111!167671#1"'&551#3531'&'511'&77161''1@ (HH hfHHf'D "11132771654''1&#"1''327654''171611!1677W R\u&&5QQ111 25*\ Q\&&u5R222 15*\@(F]6311217163211#"''1&54771'1&547''1!1716''1&11#"'&'11&'6767632) Q5&&u\R 111\?*52 ' R5u&&\Q 222\*51   0Ql7671167276'&'&#1675%&167514''"76313676551&'&'&'11"13676551676'1113676551676713676551&'&'&'117716550;;X0() #22;H9:""  6%$ 12Ki $   i)    )  $X;;" )"":9H((5(({  $%6&% )*K12E.>$$ ++)  )64 ;=66 :<)`[T ]cDp0C671167&'&'&'1'&771'1&761674'11&#"32765''00''  ''00''Z .. Z   25 PP 5r  '4AJS7671167632#"'&'&'3167&'#1'676'&'%&'&767!67&'367&'!"<=CC=<"!!"<=CC=<"!))))#$$##$$#F::$""$::FF::$""$::FX#$$##$$#H))))-@W671167654'&'&'211#"'&'67636711632#"'&''11&767632'&#"F::$""$::FF::$""$::FP      z     "(("@!"<=CC=<"!!"<=CC=<"!P       '011#1"33327654'&##151716'&'!''!11#  @ `` @ @@@@&@ֳ   @@@@a|'17716132771611''1&#"113113277165514771674''1&761761&'&'"671167632#"'&'&'     $  '     !   66I*$!"<=CC=<"!!"<=CC=<"! )      0 "  ! C**F::$""$::FF::$""$::FK\w7'11176771677167514''1&##1"''1&'&7716176''1&7716''1"#&'11165!671167632#"'&'&': : +"  G55 0!"<=CC=<"!!"<=CC=<"! ('      ((@?8-  2F::$""$::FF::$""$::F5^y7'77161676''1&7633167716''1&767716771&#&11"1''1&#"1117716167%671167632#"'&'&'176''1&77716'&7&17716'4         !$X;;   $95!"<=CC=<"!!"<=CC=<"!  \j         ) ;;X    .I,F::$""$::FF::$""$::F\     &2;DMVal671167654'&'&'7#3#5131#7#3#51312##3#5131#3#5131'5#15135#1513'#3#676331#3#"'&'31'6711632#"'&'7211#"'&'6763F::$""$::FF::$""$::F`7 /777 G@@@@@@@@P@@@@P777  7      @!"<=CC=<"!!"<=CC=<"!p( 8( ((8((`((((8(((( (8 (     1DW671167654'&'&'7611&'&'&7667'6711632#"'&'7211#"'&'6763F::$""$::FF::$""$::F ((43(( =GH<      @!"<=CC=<"!!"<=CC=<"! -- i     1DW671167654'&'&'7611&'&'&7667'11&'&54767&'11&54767F::$""$::FF::$""$::F ((43(( =GH<     @!"<=CC=<"!!"<=CC=<"! -- y@1h671167654'&'&'7611&'&'&7667'11111#14101&'&'&'010#1111111'&56767'1113111#14101&'&'&'010#1111111'&56767'11111F::$""$::FF::$""$::F ((43(( =GH<@!"<=CC=<"!!"<=CC=<"! -- T    ;P#"'&'47450367676'27&'&'&'676767&'&67676'&'11111765&'&'71111113141016767670103111131111111765&'&'7111111314101676767010311    N=! "":9HH9:"""":9HASTK ) >ASTK   l 238 -0/&# 9 b a8    KTSA> ) KTSA> )     733  $%/0.S8a aaa 81Z7671167632#"'&'&'6'11&&'&6767'"11117711765'1716'&''1'1"11117711765'1716'&''1'1&#!"<=CC=<"!!"<=CC=<"! Xr111&'516767671#1#1&'&'67673131276551&'&'3#321##1&'&'5167673111#1"'&55147633X;;"":9HH9:""%n    n ;;Xp  ;;X((H9:"""":9H%   X;; p 00 p  /A%77'111115167%163211#11#"''1&54777711##1&'5147;V  7 H 2 y???G EVH 6   2 ???G >LYgt&'1116751&''1&'551!1676751&'&'#1"''1&#5&'516771&'51675&'516771&'51671116751&''1&'51&'676'&'''U )PpP(''$$$$5$  5$ p @)@````````````@5$  5$   8JZl|471163!12#12##151&'&'1#1"'&547631"'&55316751&'#171316751&'#5316751&'#11316751&'#5316751&'#171316751&'#27116'&'&'33       `    p    p    (  ""     0  0   P      P        %Kt4'11&#"1113276551&''1&'5113276551&''1&5514'&#"11&"##131023316''1&'3#36''1&'##"#"11''6765514'&##1  <   )  <   ):1)  )(/0-Cf Ff%0g%ggg#   V=   .!+;   V=   .!+; h   {{{{{{ P 671167654'&'&'7"'&71111111111030521676767654'&'&'&'0#41"111111111&547111111111111315121676767654'&'&'&'0'11#111111111&7632'6711632#"'&'7211#"'&'6763F::$""$::FF::$""$::F1          @!"<=CC=<"!!"<=CC=<"!    i      671167654'&'&'7"'&71111111111030521676767654'&'&'&'0#41"111111111&547111111111111315121676767654'&'&'&'0'11#111111111&7632'11111#14101&'&'&'010#1111111'&56767'1113111#14101&'&'&'010#1111111'&56767'11111F::$""$::FF::$""$::F1    W@!"<=CC=<"!!"<=CC=<"!    T    $%65&'&'&'27&''1&76766'"'&71111111111030521676767654'&'&'&'0#51#111111111&547111111111111034121676767654'&'&'&'0'01"111111111&7632'211#"'&'6763 "'&7632'&'11&1771676'&'&1'"":9HH9:"""":9H5/     x    $$ ? U l(,H9:"""":9HH9:"" Y         :    v Y /BU671167654'&'&''&71163!12&'&'76711632#"'&'7211#"'&'6763F::$""$::FF::$""$::F  ++::++/      @!"<=CC=<"!!"<=CC=<"!  4!  !4z     /f671167654'&'&''&71163!12&'&'711111#14101&'&'&'010#1111111'&56767'1113111#14101&'&'&'010#1111111'&56767'11111F::$""$::FF::$""$::F  ++::++y@!"<=CC=<"!!"<=CC=<"!  4!  !4e    /Ib671167654'&'&''&71163!12&'&'7'1'&54771'1&547611''1&547716F::$""$::FF::$""$::F  ++::++%YYYY$$$$ZZ@!"<=CC=<"!!"<=CC=<"!  4!  !4000 0++ ++0 //BS671167654'&'&''&71163!12&'&'76711632#"'&''&7632'&#"F::$""$::FF::$""$::F  ++::++/    $$ @!"<=CC=<"!!"<=CC=<"!  4!  !4z      FShy471163311!12##1&'&'47#1&'&'47#1&'&'1&'#1"'&555&'#113#5567673111#1555311#%3#31#1&'&'516767 " C    " P`P     "      "  @((((((((    @1CQ%6711671167&'&'32777671&'&1177151&'&'#"'&'115/""33"" q to {q!!"#%%3""""3%%#"::: . <3 1D117@0BQ^1111#"'&'&'&'676767456571611%11'&'1677671'151327'676'&' ""33""t  {!!(  H%%#""#%%3""""3P . :/> 31171$7 "1'1&#"1771611171654'''11771677%% VV t@J fJ@ VV t%%ÂAIf IA 8b&567311'!7&'716731471167632#"'&'&57&1111771617'1&7716''1&''m EJ2ffff2JE mT)*..*))*..*)2 $ --  $ 2r 44 r0((((00((((0_ . #11# .-@7671167632#"'&'&'74'11&#"327652711654'&#"3!"<=CC=<"!!"<=CC=<"!       F::$""$::FF::$""$::F0     (C^671167654'&'&''3#3#1&'67711&'&'67327654'&'11&'67327654'F::$""$::FF::$""$::F@ $  $$  $@!"<=CC=<"!!"<=CC=<"!)   )@)   )1611!116773167&'#!!!2#!1"'&54763 P((PPPx@@   PBP   :&'11&13171674'"113331276'&'676527654'&#! ёj(  =  =  @ i  >.. ..>  Q671167!11!1&'&'547116351676731276551511#1121##1"'&55  " ) @ @@ "  Z  )    07=MTo{671167!11!1&'&'&'3111111&'&'31767317&'#'11111#16767#1674'11&'&#"32767653167&'#@, ' ) 0 ) ' , , '8 / ) ' ,""""1-  ++  -1g-1P ++  -1W####8671'1'1'17'111171327654'&#"171677v$" @ @ `  _2S"$ @ @ S2_  `<7171654''1&#"71171&56767"'17%1677171'p777}8.P  X      ,888}7.M,      X  %Hk'1'17163277111'&7716777'1&5477163210#017712105'"101771214111#"''179r9Xr h  ̒WN@ @----@ @NW9r9r  h WN@ @----@ @NW+ATg556111'1&731111'%1&''1&5!!!2#!1"'&5476374711632#"'&57211#"'&54763#)( mk#@A R @@  `     ccc0&  M T   P     ,C''&111'1&1133127%1676'&'#1"113!127654'&#!1"}.c: ! I G 9h @  MIII  _2 U %K5  GW"111132765513111327711327654''171654'&#"1'16767&'&'##3#5131   3j ii jj iV& 0pppp   ` @i jj ii jV (0 `  '8Ka#"'51&'1&'&'67676751&'76'&#"763236311276'&#"75676751&'&'`-33-:#""":9HH9:"""#: $$ z $$ m    -"::HH9:"""":9HH::"        f      '<Ob7113276767&'&'&#"67'&'&'"'11&'67676#711#"'&547632'211#"'&54763!"<=CC=<"!!"<=CC=<"!E/ '5P          F::$""$::FF::$""$::FP3 *P        MZg53151#1''#113#55#113#3#&'&'#1&'&'#1&'&'5167673!11#&'&767676'&'@`XQQQQ``)))) xo @  XXXX`X````````)))) l   0Scoy471163211167716771133127654'&##1716'&16551&'&'1327655771#&'5167314551#67&'!1!  T) )^   T {))  111((P L@ )) !H#GO&  6 %))   3/H?(05l671167654'&'&''1167676&'&'&76711111#14101&'&'&'010#1111111'&56767'1113111#14101&'&'&'010#1111111'&56767'11111F::$""$::FF::$""$::F\!! )) 6@!"<=CC=<"!!"<=CC=<"!    a    }5>GPYbo"111311#1"33127654'&##15131676'1&'&#!3#31#17#3#71313#31#1733#31#1733#31#1'7#3#'131711z4@  @3tvvv ;eee[ njjj t iiit `eee [@   @@hhhhh0hhhhhh0hh@"5767676731##&'&'&'6731711&'67676323# #3DU $#=?^@ @)!  #**#  &-21  12,&  #*+#www ]=>  $$$$       BQ6711671'&''1&'"1315167671'&''1&'"1"#1151#11&'&'567116'&'&'&'&''&'&76767611676)%   )%   #**#  &-21  12,&  #*+#@)%   ``)%   `a        *=67%1765&'&'&'&##1"'1&176''%11&'&'67@R666R!!''   P ~"0 @79+R66/??77 !!* 0 b#" 0?Yr671167654'&'&''6711632''1&##1"1'&56767''1'&54771'1&547611''1&547716F::$""$::FF::$""$::F[ )++) YYYY$$$$ZZ@!"<=CC=<"!!"<=CC=<"! 000 0++ ++0 0 ;&#1116771671677167716551&'&'"11''1' ) $$ +%  %)/zz/* @0La%''1#1"3!127654'&#!173717676'&'1'&'11&'&#"1&111716'511171677167Z<<00P""<10 01>>>b  7DQ`m|%7767&'711'#"'&''&767&'&76676326276765&''674'&'&'&'11&&6767"67113&'&'7&'&767'211#"'&54763  "R R""R R"B  S     '((''(('P  1"!!5 (( 5!!""!!5 (( 5!!"C    0Y  t  1----    @`F1133127676763"'&'&'&##1"#&'&'67654'&'67672  "(("   "((" /  "00"   "00" 0E471167632#"'&'&5'1&''1&'514763316731211   P0 #` bP Pb `# 0`    77  0a111"'&'#&'&'47&'&54767&54767&5476767633211"'#&'&'16767    p       K]jx3#31!17167#711331276551!1133127655167514'&''1&'&##1"3#31#1&'51676731#1&'%3#3#1&'67Z###        #  ````  h  `KKeeeP%9 00 9%Pe  1Q^471163312314763312311!1&'&'5167673&'1#131167513167&'#153167&'#1P @ ` @ 0    ```  `    0e0>x"1'1&11117717171677167&5&1'1&#'1'1716'71111767711117677171716''1&'&''1&'&76676'&7 L (B  N $ ,) M   F000#          J E-  P !#'.< J $$$ 96/ EEE#&>  B  >'$T$ S  N[h3#31#17167553121#''&'#1"11331676731676731276551&'&'676'&7%&'&767555qeQ Cddd. ) !$$$$! 1]     ``L```` T}}}#hp #### 02## @i111"3!127654'조1676751676551&'#151&'1#151&'1#111&'51&'&'#151&'&'#13121'&771#1&'&7716`     %y : p : p     | 0000 | %S K ` K `=6311211#"''1&5477&1#116751673117716''   W @@ P P   ؉ 8008 P P)e5310101'1'111"#&'&'67672311717111#111&'#1&'&'6751&'6767316711111`   %%%%  )88%%8  8*>R671167!11#11!11#167!1!1&'&'%71''1&77167'1'&771'1&76@@@@Z!!00p0000`!!00"0000  ,F611''1&'677'1''1&'67711777711''1&'677117     555    5%%5    5%% ee eee eFFFFFe eFB]j2111312##11#"'&551&'&'#1"'&547633167675147631132767654'&'&#"7&'&767 =+* # # *+=  =+* # # *+= """"---- # *+=  =+* # # *+=  =+* # ####P'((''(('x2111151676721"''1&'&'51176''111'1&'1110177111#&'&'5145676767676317167514763@  # & H![  l, ,_  [!H & #   .'&,,,& "I: E < :I" &,,,&'. *R`47116331221###1"'&5"'&5514763!!!6767&'&'51312##!"'&5476373#3#1&'67          6%$$%6R66/  P      `$%66%$@66RK5   @ ?H2711654'&##1"3311##111!127716'&1'1&##15135'1513@   P` C 2Q 00@    A  $ PVVVAB63131!1&'&'6767&'676731&'67673167674'&7 $"%$$" +F&'131676''53312765514'&##1"271167654'&'&#"3;  `    `   ####ؐ  """"U47116331217161111''11##1"'&5511'&''1&76771'1&'&77167615   z  zz  z   z  zz  z G  FF  G G  FF  G5H[n7671167632#"'&'&'4'11&'51&'16767'2711654'&#"34'11&#"327652711654'&#"3'4'11&#"32765!"<=CC=<"!!"<=CC=<"!@             F::$""$::FF::$""$::F`   P       -J]p7671167632#"'&'&'%4'11&#"32765671167&'716'&1"1"14'11&#"327652711654'&#"3%4'11&#"32765!"<=CC=<"!!"<=CC=<"!   @ @P   P  `   F::$""$::FF::$""$::F          57671167632#"'&'&'4'11&'51&'16767!"<=CC=<"!!"<=CC=<"!@  F::$""$::FF::$""$::F`37671167632#"'&'&'&'716'&1"#6767!"<=CC=<"!!"<=CC=<"!@L  MF::$""$::FF::$""$::F`  @-BVk671167!11!1&'&'5316751&'&'7111316751&'&'5316751&'&'67116751&'#11711676751&'#167116751&'#1175316751&'&'67116751&'#11))))0   0 0  0 0 P  0 0 P0  0 0 @))))08888  0 88 P    0  0       @.BWk111!1676751&'&'!111#1&'5167676711671#1&'5'111#1&'5167676711671#1&'5!!!676751&'&'!115&'11&'516731175567311&'&'&'11&'516731175567311&'&'`)) 0 P  0 0 P  0)@) 0 P0   0 P0  )@@)@ 88 0  88  0  )  )@  0  0  0  2Kj711767&'&7'&76767637167676701&'&'&17600'&'01&167671176767716'&'&'&17&'&'050167611''&'&'05056761011'&'&'47676K -,-    ',,SS'' *W     d$#,-,- * &'SS,,            &&%23,K6<   :'   %%% ':   :2      c"& @$1>11167671&'&'#&'&7677'&'676'&'&767@--DD--`  00  D----D `  PH531'1#7'31212#&'&#"#1&'&#""'&5476351476331516767313#36111'#1&'&'''1&7&'&'516767&77166767676'&'%67316111'#1&'&'''1&7&'&'516767&771667&'&767 0PMMMP  !!((!!@!!((!!   `                    P@@@@&fff @    @ P                 k  Tan'#1513'5#1"1"33167674'3167674'3127654'Ȃ'&##1'1&'#1'&'676!'&'676qLLLQ  ! 00 B 00 !  1la  `````ppp @  0  00  0  @      @18A]111!167671&'&'!'''1#11'&771632731'67&'7556711"'#&'&'67672@@HHH Z  H*  @    A****,`0@M671167&'&'&5711#1"331132765513127654'&##16767&'&'`    @6%$ / `  ` / $%6@  $%6' !     ! '6%$#3[111!327654'񽋽14'&##!!!1!1"'&5476367311311#11#1&'51#1&'5167315`))     p 00 00))  @ @ @  00 pp 0 5Ni|3#31#151675#11336763251&'&'#151&'&'#1#3#"'&551#11!1&'47#4'11&'&#"3276765'131#1&'51678@##)@``` ('@""&&""""&&"" 0(((((`!(  /A'!!!!''!!!!'P0@ ?Qcs&'11&'#11#151&'1#151&'1#111!!676751&'&'#155#1&'516731#3#&'5167311'#1&'516731%1#1&'51673%5#1&'516731'1#1&'51673#1&'516731#3#&'5167311%5#1&'516731'1#1&'516735#1&'516731 ` @@     p`    p            0        0HHHH `     0      P        0    p  6%6711671167&'&'&'#011111111113676735'&'"11211&'51&'1111&'&763327656'&''101&'&'67675167H9:"""":9HH9:""/ ,&#08        //::////:E4% 8    *U11&'&'&71111110521676767&'67676711674'1311111#&'&'&'&'&'11#&'&'&1111167516767&'&''1&'&7&763276'&'5;;X:/ "  ';;XX;;Z>=S66'  " /:I66        K12   ,;K1221K 88V11G;,   $#97    9111#113113167675131676751&'&'#151&'&'# P  P   P  P   P        P   y%771&'&'51656'&#"#1&'514'&#"1#1&#&1#1"331132771132765516731376'4''1673127654'&##%671'671'&'71&'717'1677'167'7&'71211#"'&54763R000A "  -;  ;- "   "  -;  ;-  "  $ +A0AA0h%+ w% +A1@A+++ %]  +++$ ;- "   "  -;  ;- "   "  -;  cA0g%+ x$ +A0AA0g%+ 000Ab   8Sao#3#1111'16771516767317163213111151515151#55132771111!1&'&'13#3#1&'673#3#1&'67GGw` M21M ` l` '(YF, % % ,FY(' Ρ  @!-!!!&'&'167673113311%3167&'#   @ !A%11!1&'&'16767311331%67513167&'#151&'1#131  @@@@ @ (@@@@@767!11&''1&551'1&7471167632#"'&'&576763276'&'51&'11#&'&'&2131111167516767&'&'11&'&71147  k=''@  ""&&""""&&""y        //A)$0 O'!!!!''!!!!'!       131516713151671315167111212121##151#151#151#11311311#151&'&'1#15131513151#11#11#11#1"'&551476351476351476351515167"11131514'&#'531514'&#"x(0(   @ P  P @    @  @   @ @ ` ` ``0  0`` ` ` @ @  00 P  Mh{73#36751476321675147632167514763213121#"'&''1&547633116767654'&'&'211#"'&54763#---      - V )*..*) V            _""_         'H17161111''11''11'&7711'&771'1&76771'1&76171677''11111716171671'1&761'1&76771'1&'&7711'&'' L '\TB Z55Z AT\' L       Y5 T 'A\ LL \A' T 5Y        07''&7617167177161111''1&16767&'&767654'&76131201131&'&'&7316''1&5&54563316''1&76767671&1'&7716''1&547716'  &&.'  )  . #@@QQ@@# .  )  '.&&   > "#09% # ))2/D))))D . 2)) # %90#" = #4671167!321#12##!&'&'113!151!1"7''001#"''167671#"'&5477141414'1'&771&'&'113276''171654''1716' "#1'14#"1'1&111101327711&'&76'&741')    )@  Z% )) %           `)  @  )@ @  && $#  po!$@"LXdx'71'176111111'%1515167%%%1177111'%1&'51176''15117'&176''6'&177&17716'&1''< 5 + + 5 @ @` @ @ '&''HGGGGGGvPYYPUUU.  PP  .U           3<E611111111111110011111111111717167654''1&76167611111133330111#11111112'&'1''11163&''11#"'&567511&'67271'11'717111111#1'105"'&'&'&'&'67676767272171311111114'1611151'1&711111111116747674705&'&547674'&'&'1111111111&7767&'67&' 0  *$)    L -(  (- L    *"*  0  H  (   $""'0(   (("" +     + #"((   (0'""$   (w##j##P61111!1&'&771517173#313151311315131131513113011!1&'&771212550@0@@@(@0@(@0@0b  b   `7Iax"1113151676731514'&#!"111311312765514'&#!3#31#1&'5167"11116771514'&#!7&''113!127655 `  `   P      `    @    ss  Ueeee  /Ia{0EZ63211#"'&551477363211#"'&5514777763211#"'&55147763211#"'&5514777763211#"'&55147763211#"'&5514777763211#"'&5514721113315147632131276551476321#11312###"'&547633151#1&'&'514763321111#151514763321111#151514763321111#151514763321111#151514763  `  N  r  N  r  N       )  ) ` @ ` @  @ ` @ + ++ ++++++ ++ ++++++ ++ ++++++ N     )@   @) ` ` ` ` ` ` ` ` *ey2011111!1&'67676711110167676355&'1#1"'&5514763!121##151&'1#151&''111#611#151476773#311##1&'&'15!!)--)!!p0  0@@ F @ "7,+7"HHHH   HH::    %   c&117716''"#"0111267676763015111311111654'&#"00#&'&'0#&'&1"1163#1133&'&'&'&'45"5114'&'&'"#"010110267674'316771633121#&'&'&'4141#14'&' 1100103676751&'&'#11##165&'&'7{    b /   !    "  & 56%$'  &  ())( 1  0&      >      g       $%6# `   )`) 0   &'673163271&'6767"#011172767516767"1&'3276763#0#"'&'&'7&'&'&'#"'&'6776767&'1#&'0111&'&'&'672327676767476747&'&'&'51&'&#&'671376771676767'1"#&'&'67673&'670%%       #  &  &  #!                           %@7551'7751''167765&'&'1%671167632#"'&'&'^(6F,-%^^^6()-,FY!"<=CC=<"!!"<=CC=<"!yyyM# ^nnn 34I5*2MMMy #2*5I43 n_F::$""$::FF::$""$::F+9I5113151676713151&''1514''1&11315167116751&''113)``) L L  Pg7 gPSmmm``m L L \ 8 \80F]111!167671&'&'!2111#"'&5514763747116321#"'&552111#"'&5514763@@@  @     @ ` ` @       0F]&'11&'!11!1676711##1"'&54763312211##1"'&54763311##1"'&54763312@ ` ` @       `@@  @       C&'&767'771676'&'&1'1&'"11#1"331676''17`  w  X   8* 06W  t-$$$$  H   -$! ]'  VZ:u6761111''1&'&'5147632167514''1&'&767#1167514763211'&551677167514771676_ x  O +  W > W  + O  x  I ` - "!-v PU    UP v-!" - ` I #3Sv111!#"'&5476351"'&5147633!!!1!127654'&#'711177115'1716''1'1&11276'&#&'&'6767276'&'`))      N      $%6' )) '6%$))  @ @ @     *6%$(($%6h%1#"''1&'&'6767'&'11#&'&'&1111167516767&'&''1&'&7&763276'&'5' ~5FX;;;;XX;;        F5~ ';;XX;;;;Xh    1D%1#"''1&'&'6767'&'11&'76767#4711632#"'&5' ~5FX;;;;XX;;"" p   F5~ ';;XX;;;;X ""&'( ('&  ,CT&567716551#1112773#35147&##15127716751#755&'&'#1132@ @%) / ` @%) s2 ` !?'0  0/)  0/)W'?   @+^671163312##11''1#1"'&547633116311217163211#"''11#"'&54771'1&547 i f. .$AUn )) ** )) ** r    p" ** )) ** )) (\767116711672#&#232#&'&'&'%631121111''1&1'&7714''1&76771677"":9H2,  X;;;;X  ,2H9:""wG3 ?? 3GH9:"" ;;XX;; "":9Hw@ 2F!!F2 @LSZaho%731''''#1113173'##11&''1#1"'&54771'1&547633171671312''71#'''13#3#17731''71#*!666z66z6B555 n8  8n 55 n9  8n 66*d6****y6""""6XXXXXXWWW  \\  WW  [[  WX####8,,,,8##""""Z,,,,!6Ko6111##514'&#"1##51516777163211##1&'&'5147716327&1#111311771316''1716'#1'6 yp  py@ @@ @    e%r` `r%e  G  G y     5fmz&'&#"132767!!!1!17"111327671&'&#4771'1&567317163213111#11#"''1#1&'77#1''3171'1#1731'7#3#17'731''71#''13`    P    t9 99 9|*AFF!!!!`*`!!! @ @ @ @  106 6016 66$$$$p444444L<$$$$<h9j1131131513113151311315131676751&'"1#!1"''1&#53276551!1132765513127654'&#!1"33 @`@`@  11 @     @  p @@@@@@ C   C     7767632112##11111"##11#11#"'&551#11#"'&551#11#"'&551#1&'676751#1"#&'&'&'45676767716771715151#1"'&'&'&767637167#3#133553351##11#3=  &' -(    (- '& =3``Hx$ 8 B#         #B 0 $j@@@@@@G>1''1#1&'&'51676731716'71611''11'&771'1&76-DD|7777777777   x@x 77777777775H[11&'&'6767671167654'&'&'4'11&#"327654711632#"'&5))))R6666RF::$""$::FF::$""$::F   @   ))))66RR66@!"<=CC=<"!!"<=CC=<"!`    9.H[{7&767!11#1311#1311#1311!!!!1!1&'&'5167672711654'&#"31''171611'&'&7676! |jb        !!, 11 ,`,, @@@       `    :AA:  6EEEE6 #4MV_671167!321#12##!&'&'113!151!1"&'11&'131675167'&'6767&'&11771176''1716'&1')    )@  ""@p0z MM jj MM jj`)  @  )@ @ 0   !a !! .. !! ..@/86'11&'&1'1&'&111336767514'17#3#711#y '' 0    0Ywwwwxx  11  <  % 5P#-66R0")#) " !")?)) 4#-Q76P")%) " HU|111"#"51&'&'271'&''1'1&'&771'1&76771716761716676'&'11!1&'&'6767516767263&U&#))) U22UGG  ")#) "U7)))  TGGU22$$$$")%) " v75133127655116751327167516713312765511112767716''151&'1'1&'&###1167675151516767&'%&567311&''`      *  5#3"" w"00"  X  X  2 ? fRJ""36  (&@p  !! #5GYj~'7716'"157716''1&%'771654''1&#&'11&11767571237165&#6751&''1"123''276''1&#"1%''&#"171676'776'&##117'3#3276''1&##1"131555N !< .&NNN 5 - <1    VO NNNV OOO OZ P  P B  b .{{{\    b  \{4@ ^4 @xxxx     )=611''1&'677'1''1&'51476!611'&551477 ` hh ```` W  W `@S\7767213121311##1'5##1"'&551#"'1##1"'&551&''1&76761337&'676 48" %pj   $,,$   -  p0! "@a ss 1  @LXb~''&'&771'1&763331#1"''1#111#!"'&'&5476763%1674''1&'515701110101011''676711611#1&'&7711'&77`444  ), p0/9   !j /"0,.///  E ~C    %M   'B/$-/B-95 %  W2+ < oC71#'&#67674'&74771633127676'&56767276'&'&'      Y   0  /0BK12     0  ?()21KY 2K^r011771676'&'&1'6'11&'&#"1763277111743676''1&'&3167&'&'&1%&113167676''#3#1316751&'!1316751&'#1316751&'#!1316751&'#'&'167&'16753&'1675QD       C :P E PE2PPPP0PPPPPP@# -  L x  LL0 .  L )$ . L $) .00000000 !(^6711673113311#11#1&'&'#3#513#321&'51&'#11316751671##1"'&551476333#3#11##1&'6731674''1&'47633165516711#"''1&55167 0   #### % ++ % c @ P P        ##  5,,5   6L2111#151476347116321#15347116321#"'&5547116321#"'&555532732711##1"'&551&''1&'516767312##1316767 @   @   `   `   %X 88 pp @ PP ` `@ @ @X  (!!` N  &5  5H[7#&'167671"''1&1#"''1&#"1#"''1&'&4'11&#"327652711654'&#"3( 66RR66    x   `   R6666R  # #      G/C%''1&551'1&5677163311171611''1&771'7711&'&'67-#'P /9*-$ X}& $ !& ,  &*%1X&  $%6IZm~T1167&'&'&#"1167&'&'&#"67&'&'&#"71167&'&'&#"67&'&'&#"71167&'&'&#"67&'&'&#"71167&'&'&#"67&'&'&#"11315151&'311315151&'311315151&'311315151&'311315151&'311315151&''4'11&#"1#1"'&5514'&#"1311#1"33327654'&##151316767514'&#"1##15:>R..R>( @ @  @ @     )  )  055555558````````````  ` `)@   @)` ` 6Vl777677163111#1717167&''1'1&'1111#&#"11113277171654''1'!!!2#!1"'&54763@iii1<] (  ( (  ( @ @  5^# (  ( #    M_w676'&'711#"'&551'1&77167613151671010101011&'51#1&''7711'&'&77''1&'&771676331232  J'$$$* 8$$$0    LLL2Y SJ#T +8񊊊*d  Z [ 612331271611#1&'51#11#1&'51&'&'&'&'13311##1"'&551#"'1##1"'&5511'&7716567671133267'1&7&'6767&''&'6767&'    @   @ "" @  66R9 IXX0  )  %"  @ L L w) 1R88 p@bk%5531176751&'3167&'####16751671131676''1&771654511331276551671157&'67  P 6%$`K0!  "  T   0NNN#L$%6'"88 *,24 ?   .AN%11#11#1'1716''1&111#1&'&'51#1&'&547%162151476331211@ {&Q u 23"@" 8  Mp  2   0%   0d%  33F?2332>'  & v;7676'4'&'&'67&'%671167671&'&'&'5@GhhG 7YY7 G43HH34G"HeeH""HeeH" %%    ((%##%`%##%` Vm&'&7676323111767716'&''171133127654'&##1&''1&''1&#13277#3#"3316771'1&'@W 9   900" #;;; F    ^ 5Y  e$R   6!   )@/C533351&'&'7167675167673151&'&'!671167&'#113 0  p)`0 )p000 P  0)@ 0) 3Fy111##1"'&551&'&567672711654'&#"374'11&#"3276567116171611''11'&'&76771'1&'&7p ` ()==)(         @" "6%$$%60      YY CC YY CC  61'1&7P   0 6'&11'1&''1&111177167711176''1&7716767117716''11176''1&''17167716'&11716''1&11514'&'&1&'514'&1'1&77 ! 9P  <<  P9 !   ((   ! 9P  =<  P9 !  0  0  U"99 8  8 99"U T (( T U"99 8  8 99"U T0    0T `2ENW`i11##1&'&76767656767!&'11&'676756711654'&'%&'673&'6767&'7&'67"     )D))))  @0P&442vFE  55LR6666RR6666RR6606711673121315147716761131211&##1##111#"''11##1"'&551&'1#"''1&54771&'#1"'&55147633167'1&547716515153#3#133'676'&'67&'&'11&'676323`j0j  8 +=#P          jjj q'Z----`%#"% x"%"  " - .            ```'((''(('@%.#%!+ETc3#3&'7&#3176711674'#1131'1'7'31312765&'&'#1"1133151%&'11&'#116765ggg C&) R[66%$$%6d >:!///D"R  23K\  "@ 09 p2D $D$%66%$8h`OOO"  K32  #$) _ '4A!!!13167716713167671&'&'676'&'%&'&767@x'  &y   $$$$"@@"$$$$@  +Ln6111#1"1#"''1&547716551673127%21111#"''1'1&547717163%'111#"''1'1&5477171632721111#"''1'1&547717163 V  * p# 33443344x ` *  c4334444334F*U113312#!1"3!16767&'&'#1"113316767&'&'!1"3!12##1"3#36767&'&'#1"3312##1"3    @))  @  ))    ))       ))  ))   ))    6H631121#'111#"''1&5477167677171&547'7716''1&1 @ 1  X1  BBB b B b  @  1X 1 BBB b B b <7113167632367232316767&'&'0#0#65&'&'&'&#4'11&#"&'&#"01"#"321230"3276701327654503327654'&'012327654'&#"1"#0365654'&#"0145676'&'!676'&')--))"&!0               )  ))" 0  `          C$JWdq~113676'&#&'&'47676'&'"#671167&'&'65&'&'"&'&#1!&17716'3&17716'3&17716'3&17716'1###6$ &   q"" )#)  `  `  `  /  ## &  " " )$)$ 0 0 0 0 0 0 0 0)AYs7&'11&'6767&567672672121!63211&'&'51477363211&'&'514777763211&'&'5147`) 0!&"))# ## #}#### )  0 "))4A    AA    AAAAAA    )6CQ^7&'11&'6767&567672672121!1'&771631'&77167'&7716'1'&7716`) 0!&"))0 0 y0 0 000 0 0 0 )  0 "))" p p p pppp p  p p6ER_ly1&#1'&''1'1&'&771'1&767717167617162&'67671'&771631'&771631'&771631'&7716711!1&'&'6767516767263& #) 8U22UGGV E  `  `  `  K")#) "?!) 1"'UGGU22  0 0 0 0 0 0 0 0 t")%) " Dk6763217163213331'&''1&'1!1'1&1##1&'&'4771&'&'3#311##1"'&551#11##1"'&551513'&#"11"117711765'1716'&#'1'7"11"117711765'1716'&#'1'1&#&#"11"117711765'1716'&#'1'@.. L ?'  ( * L```     `  k  u   ,,  H 2   W^ ^ @@ @@ @@   211171632771611''1&'1177111''1&11716177111''1&11716177111'&11#"'&55151515151515151514763&'67367&'&'67367&'  E;7#&&$  -BA!LO"-BA>C?F85LO"-BA>C?F85LO""IE;@@  P     $  ! > ! ! > ! ! " "P @F!?!?!9  `09L767116761"'51&'&'&'4'11&'&#"3276765'211#"'&5476301LM1101LM11   `  O98 ? 98PP88@  98P0     )\3#31312#!1"'&5476331676751673#3131513113151311315131131!1&'&77121255=+*    *+=@@@(@0@(@0@0 *+=   =+*   'BU^7714'&12767716'&#17165&'"211#"'&'&54767634'11&#"3276567&' /9:V7./f K ####   KKK f/.7V:9/  """"`  `@%6`m4'11&#"1315!4'11&#"13276527116551#113"1176771327653276514'&##&'&76755133127654'&##1'1&'11132765511132765514''  @@    @ `      I C)   &  @    ڛ     P  HHH  )7 `+5 ; 4Fc&##1&771632131316767&'&'65&'&'#165&'&'&13117716'&'#1716' %  !  % $-  F4  F4  !! :%! % i  i 4_11111#"'&5516767671#"'&551&'&'&'111#"'&55167671#"'&551&'&'5#"'&5516767671#"'&551&'&'@H9:""  +*IHYYHI*+  "":9H  $%66%$    32??23  --DD--`"":9H` `YHI*++*IHY` `H9:""` `6%$$%6` `@``` `?2332?` `D----D:b671167311!15%"1111771176''1716'&''1'1&#&#"1111771176''1716'&''1''"1111771176''1716'&''1'1&#3#!116751476321&'&'51#111##1"'&551#11##1"'&551513--DD--        "" @ @ D----D@@@    P0 0""0 @ @@ @`$2@N[113167316767&'&'"&'&#&'!!!!167&'#3#3167&'#!!!!167&''&'#13167 ()={#22#0  0%2#&5=)(HPP@ppppPPhh0=)( 00 ()=`H-Kr211#"'&54763271167654'&'&#"3%6711671&'&'47675711101016767&'&'010151&'&'671167&'51&'1       ""00 ()==)( 0       P  ""p 0%3=)(()=3%0 ` !  ! -Lr4'11&#"32765#471167632#"'&'&5'11167674'&'51&'&'67116710101&'&'67670101511&'&'6751671      ""  p 00 ()==)(  `      "" 00  0%3=)(()=3%  ! 33 !8U71131716321336767&'&'0#0#65&'&'&'&#&13117716'&'#1716')/ @))"&!0 J  F4  F4 )u :))" 0   i  i !1A5!1677165&'!1"!!!!1'1&''31654'!113277167#a& `R(T/ uuu  N  &  `6*?EEE #v!$$ N&AY&'11&'676726763"'1#"''1#77632132771'1&##1"17767311#!1&'&'477$$  000  ;*<+*+ h 0 0 0  BC`@$F671167!11!1&1'1&17716'671167311!151311!1&'&'5`   9o/@g     p  0/o/@  `  `B6m667116'&'&'&'&''&'&767676116767116'&'&'&'&''&'&76767611676567116'&'&'&'&''&'&76767611676#**#  &-21  12,&  #*+#%#**#  &-21  12,&  #*+##**#  &-21  12,&  #*+#z                      5Lc676'&'67116132771611#151&''1&'&7'11#"''1&'&777711#"'&54771'#$$##$$#p $)33)$  %$ Z<<<  0 2===2 0  h))))9     $$  555&  0  H5555H  0  % 4AN!!!676767671167312##11#"'&'&'&5335&'&767676'&', u    ))-,*)   8..   @&$##$&@0  ALYhy"7627677676'&'&763676'&'&'65&'&#&'&'&76'676'&'6'&'&#&67"6326767&#6767&"."4*89&!786587!&98+5".  11  C:   " j,%  &+   " /G(!4&:=00  00=:&4!(G/ $&&&&$   ( +$$ b    ( $$+ 9e11332765&'&'&'"11332765&'&'"&'11&'16767&'&'#1131&'&'5 ?23  &'AAP 6%$  66R `  ()==)(()=    32? PAA'& ` $%6 R66   =)(()==)(`   .?O21113151476321311!151676731514763!!!1!1&'&'1316751&'#  0 @ 0 @  P``     00     @``.?O21113151476321311!151676731514763!!!1!1&'&'1!16751&'!  0 @ 0 @  P      00     @@@+5?IR[d63117%1676551&'&'"177'6711'771&'''167'1'17'1'17'1'17] T#*+@+%3  Y... .===> V<<<=l====g====< "#)@+*Q =>5/// .;R&&&&C&&&&A%%%%,S110136767654'&'&'1765&'&'&#"1''1111771'1&761716765&'&'[      f?'< 7| 4 =d#%&7      .= 7 ?4 <. '7&% AO\enw"1113311#1"11!16767514''1&'&##151312765514'&##3#3#1&'6767!1!1&'7&'677&'67&'677&'67&'677&'67&'67@ P9P   `0xHHH @ FF @ 0hhhhh!Aa%#3#&'51676171632111111#"''11'&'51673!1''11#"''1&54771'1&7673'&'&771'1&5477163217161#Ȑ (I$I(  (I$I(  (I$I(  (I$I(  (I$I( @ (I%I(  (I$I( @ (I$I( @ .c13171#55#11333#3'1#133#3674''1&'#1'#1"331132765!132765713127654'&##171!2^[c| }}}c^^^ZS    @    TT      %:a3#31#1&'477167#3#7131355311#7&'&''1311&#"11#1#"'&5'1#1"'&5476331'1!1777632&'&'67676301&'11&'&327672[[[^|||c c:  Z 0    2 --DE-,"!&  & TH @T KL6   # **.D----D9/0   a7533151671315167131516713151671312765514'&##1514'&##1514'&##1"1#1"1#1" @@@@@       pppppppp      ;Gv6'&1'1&1'1&1#1131&551476767&'#1716'&17'#1&'672#1131513113151&'&'#165&'&'1'1&'113151#13#3676751#1#17163       $ 1 \   ##0  `1      0 &&&   P``P  (( P0 P8& W`i617161171611'&'&76771'1'&''11'11''1'1&'&7676171&'&777171'37171'}}O %)  GG  ).$%  $%.)  GG  )% O,Z KLLLY..+,+V  V.AA.V  V+,+7555 :: 5 "131676716'&#!''!11!  22 @8v W m7127716331111136771632136''1&771676731#1"131211133165&'&'&#"''1&#"''1&##1"1113316767%671167632#"'&'&'7&17716' !!!  *           87U    6++J!"<=CC=<"!!"<=CC=<"!             "V::  ! -dF::$""$::FF::$""$::F ` +7"113!127654'&#!5"113!127654'&#!          +4'11&#"13276534'11&#"132765@         5B&111&#"767676767654'717167716''&'&7670M#$$ '"*+33# M)0(  0)M #33,)"' $$#M0(2611176''1716''1611#"''1&'516767w$!2Lp>L 7--BBB`@@@@@   B`~~~;""~yyy . F: P  P :F :%!!!'1&56767311716331471163!121#!1"'&55` ;'(;2&& O    @;('1~V@    :If167&'&''1&'&5&'"111316767316767&'&'#3#3#15'&'167&'&''1&'&5X    8 ))0  00              )) 00 @  `      &:G#1"'&767676271#"'&'&77137#3#&'71676#'&'&767& ( H(H .55. H&H (   / 5,, } }  } P/} ,,5 05E[m211#"'&'&5476763671167654'&'&'67'1&'&337327676''1#"'73#3276'&'&12711654'&#"34,,,,44,,,,4F::$""$::FF::$""$::F8$ '  H$$$  $  THHH  ' $8  --33----33--@!"<=CC=<"!!"<=CC=<"! ? #5 1>>>  >1 5# >!    AN[676'&'5#"'&551'&'&77167633121'1#"'&551#1&'167676'&'55#1"'&771"'&'&771676321#1##11#"'&551#11#"'&5P(             ""         Ѐ  dd  `00  P``` _  _ ` `` IR[&111&#"11&#"327654'7117654'7117716''171654''1&#"1'''711'''711`Z%,0( l  l Y`Y7 0 7YHHH>H>HHH>H>`Y l  l (0,%Y`Y7 0 7YHHH>H>HHH>H>Hc471163#"'&5&'&'&'"'&5'71&547632#"'11#&'&'47676711#"'&5&'&'"'&54763 PAA'&  32? hhh  h #)X;; R66  $%6  &'AAP ?23 hhh  h ;;X)# }66R 6%$  )7E#3#"11!167671&'&'5&'516735&'516735&'5167@MPPMX000000000000)2@IW`n3#3211!1&'&'16767"1113151#3#!51##%4'11&##11315'53151#27116551#113'53151#1133151#1@M  @ PPP  @@@ @ @@`  @M  @@@ @ @@@@  @@@@@@  @  9Kbz676'&'47116331111#"'&551'1&76771#1"'&57711#"'&5471##1&'6731675167'&''1&7617716` " J<  NK /WWW R CYY; <     P F<I CM VVV S `  < ;   3q676'&'6171'1&7111177161'%1&77'716116771611''1&''111'1'11'&771'1&76} .Km(  2 ,, t  7T 4  :       fEK4' JC    ! 3   I   @ -v676'&'23111#171'1&'1#11677163011121#131210331210331676751&'1#171674'&##1&''1&''1&#17#1716'&''171133P  mWX) ; 6j8+E  900" 3, 9 `@^ 5RX ~'  6! YL$R Ee"113113151311315167675127654'&###"1"'&''1&'&'&##4'11&#"1!1"3!167675  )@@)   911#") I   %  ) )`  )1#   %6a%6711671167&'&'&'#01111111111367673'47116331#1"1##1&'6731654''1&'%3#3#1"1##1&'6731654''1&'4763'7161&'511#"''11&'51676H9:"""":9HH9:""/ ,&#08    ####  //::////:E4%     %    //// `00` Zkx611111''11111331#1"'%1&''1&7611&5&76771516771'1&''1&767'&7716''11&'&767 *~  HG! W J". G5 T%   2b 8 K! 5'2 === K ," ^R[dmv715167171611##1"'&'676'&''1'1&761516711676'&56767'67&'&'6767&'&'6767&'51327716551&'U 0 8I0..0I8 1  )) u00  3 (    -GE--EG-    ( ))-P0 ^t}'#1'1513''&'#11#1"1!167674'3111327654''15151716'&'&11#1514'4'11!1&'&'6767!&'6767&''&'6767&'+EEEp@kWWW){    00  +6 79 9@M    8h@`% p k"0  037 6SUG  G5m    0;471163!12#!1"'&5471163332##11#"'&551#1"'&5 @            /QXf31113!1276''16767&'&'513167&'!#"'&'&71111&7676320111155113#3#1&'67$  $ph/PP//PP/8  #F+< <+F#  @+;hq&113311132771654''1&'&'1514''2771&7'1%4'&'&1##1&'5147716'&'&#1161676767&'O( P 6m p @ pm h;v >@9@=)(U%8 (h mp @ p m6 Pyv !> ?9@()=U#",%Uew211#"'&547634711632#"'&567116731511'&77171611311!1&'&'531316751&'#5316751&'#171316751&'#      Ո@@@p@@@@   8  B*00,L@@@@@@@@9776311#1&'&'5167716316767514''1&'47 U$11JR665 &% Q#/.3J1166RL6Y&&5+"C&O6111"11'1&7676767017167677767670171676711317111''/U--/.Y# V--/0X_11''N+ L#%23b+ 0**1/11/ ,0//1--6 14410%%  ""01663 ,#4^671167!321#12##!&'&'113!151!1"5#11311316751316751&'#151&'#1)    )@  00 00 `)  @  )@ @ 0000 00 0&&11111!16767516767&'&'&#<<11   11<<###?  ?## %5!16771635!1&'&'51! X;;  ;;X0A8`%11#11!1&'&'51#1&'&547%162151476331211%1#11311316751316751&'#151&'#@    k   5 00 00   ^% y. ?0 00 0$7DW11#11!167671&'&'#1&'&'211#"'&54763676'&'67116731#1&'  &%    @  0"@"@@   $$$$""6^%6711671167&'&'&'#0111111111136767367311311#11#1&'51#1&'5167315H9:"""":9HH9:""/ ,&#08  00 00//::////:E4%  0 00 0ET111327654''1&#"7113277167716771010171'11'171'1'1171677) `"""c c l#J-4C4-KCCC  M  ###l b c#K-4C4-JDCCC M  I\ex7''1&117716331213676751476771674'&''1&'&''1&'&#211#"'&5476367&'211#"'&54763 < > *!%# "L          '   P   -&'11&'11&'4767676'&6747676++*+@@+*++6% #0//6:>?+,,+?>:6//j #21,&-,@!Ce4'11&#"113151#1513151#15113312765514'&##1"''1&##1"113312765514'&##1"''1&##1"@    c  C  c  C  `@@@      $-6Ma7"'11&547676767#!7&'6767&''&'67671167!1!1&'&'67!11!1&'&'5=  0/XX/0  zSp       %%""""%%   `0    ` D"111&#11&'51"1113167675151&'&'"&'&#"514'&#  -,:v6%$       I8&;'$%$6@     @-?"1111"''11!151&'&'1#&'51514'&##676765&'!  08""!"80  @DDDD d T55C@BC44T d @1[h11131#1131#1131&547675151&'&'#3#31311#11#1&'51#1&'5167315167&'&767113312765&'&'#10    hh'((''(('  'f' @P $` @---- ''y111#"'&5471632&10#111111111#176771036767676771676771676767677167673167676'11#"'''&5477163211' ` .                   `F               ~   !,65&'&'#1336767&'&'#'6771!o()==)(  6  iiii =)(()=      *R671167!11#11!11#167!1!1&'&'%67311311#11#1&'51#1&'5167315@@@@Z!!  00 00`!!0 00 03?K671167!11!1&'&'53!12765514'&#!1"3167&'#33167&'#@ @  8800@ @@@ @ ,N61'"''1&'#1&'51&'#1&'&76326''1&777311311#1"'&547677167  *   I%+# ]]]( L=Z[k; 2:  ,A   P  P 0R./   5"6I\o&11121210071676'&'&'&'45&'&'&'"#0117%'211#"'&547634711632#"'&54711632#"'&5  YHI*+, ./JK\&'AAPe |  @      ,+*IHY  \KJ/.gPAA'& e     0  8#3#'1&767313#301!1&'&'6767670111116767&'11#&'&'&1111167516767&'&'1151&'&7&763276'&'5@/ /*) )) )*T        `G  G "#78R))R87#"X     #3:kx111!#"'&5476351"'&5147633!!!1!127654'&#''#17'733113277131276''1716'&##1'1&#"1#1"3773111#1'57'137771#3#31''#177'13`))       7 8  7 8 88*E7))  @ @ @  000 00 00 00 00000000H0"+E#3#5131%111!1676751&'&'!5!151!%111!1676751&'&'!p    `p    ` ` @  @  @ @  @ !2O3#31312#!1"'&54763317167!!!1##1"'&'"177116751176''1&#xxx `  `    P''P     S@P''P!2O3#31312#!1"'&54763317167!!!1!1&'&'"177116751176''1&#xxx `  `  P''P    @@P''P"2Oy556771611111&'&'5145111676751#1617716#!1"'&567675#11311316751316751&'#151&'#1`` `$%66$%0""  G G 2 ~ 2`@::: $$ :(6%$$%6(0"" L L ))7 7))E471163312131514763312##11##1"'&51#11##1"'&54763315  `  `  `  `    `   =Jer676'&'''&#"11132765514''171133127654'&##676'&'34'11&'&#"32767653676'&'34'11&'&#"3276765  >>> S<  +<) @ 5#$$##$$#""""#$$##$$#""""`@111 @&o  1!  ))))####))))#####=5#15135#1513'#3#51313#31#15111!167671&'&'!@`@@@%8K^q /BUh{"'11&547632#7211#"'&54763211#"'&54763"'11&547632#211#"'&54763"'11&547632#211#"'&54763"'11&547632#211#"'&54763"'11&547632#211#"'&54763211#"'&54763"'11&547632#211#"'&54763"'11&547632#211#"'&54763"'11&547632#%211#"'&54763%"'11&547632#%211#"'&54763"'11&547632#   `            `                               @          @                 @     @     @   @     @   @   2EXk~71132765167!127654'&#!134'11&#"3276534'11&#"32765#4'11&#"3276534'11&#"32765'2711654'&#"3"11327654'�'&#"3  P "     `            P  "               D ;^676'&'6171671171631!1"'&771673171%1&7'1#"'&551'11'&'&77171 2' #O"  `     Sppp  =% 0   &+%g".   \000` Ko  !@S"'1#1"76711323676'&'131276545&'&71514'&#211#"'&54763B""  r  56C  A""  r  56C    56C  A""  r  56C  B""  r    *O\z1&'&'67675111&'&'6767516771677633121311#1&'&'5167673&'&767%73121'&771#1"'&7716%''1&7676171676 ` W >     u'''8  '8   a `    9v   `   p  p h  ZZZ p Z p ; d d'671161&''1&76771616767'1&77[ X<''Nqx#"''1&76761147632171676471163311312##1&'&771#1"'&511'&''1#11'&'&77171673#3'1  X    X  J3  J3 ` @ X @ ((( `  $. $  ` I  I     ((''Nqx&#"176771132765117676''1133113127654'&##1716'&'#1"11767713117676''1'1&'771#  X    X 3J  3J  ` @ X @ ( `  $ .$  ` I  I     ((((@'=Si#"''1&767611476321716763#32##1"'&547633#32##1"'&547633#32##1"'&547633#32##1"'&54763  X    X    ``` `      `  $. $  `         @'=Si&#"176771132765117676''7"1133127654'&##"1133127654'&##"1133127654'&##"1133127654'&##  X    X     ` `     `  $ .$  `         '(Sf27716'&'&114'&#"1'1&'&13%&17711#1"33327654'&##1514''611'&'&76777677165&'&' X    X #0   00  !    1%% `  $. $  `  4   `   q  B$%% '(Sf21'&''11#"'&511'&'&771631312###"'&5476331511'&'&767716'67116'&'&7&'11&567671'&'&77 X    X #  00   0   )%%1  `  $ .$  ` `   4    7 %%$B  @")GS^|11767713117676''1'1&'#3#717513316767&'65&'&'#1"#3#51313#3#1565114'&#"1'1&#"13277pC  Z B &&&} P" "@ `  00 I `    --```` "$" @ @ J ` @` ,97&'&767367&'&'!16767&'&'#7&'&767----x()==)(()=`=)(()==)(p----'((''(('#-=)(()==)(()==)(()=-#'((''(('&I6711016763#"'&'676767201116767676&'&'&'&76@    *+55+*    $44EE45#& +%>>\\>>$, & ((34% %43((  :+'',9 %=763312116765&'&'&''1&'&##1"111!1%1&##1"1 <2$ &)3 .&&8999#& 4 ')  *3#351#1531676751#755&'&'#113D----D@D----D--D D----D D--#0=JW6'&1111!167671&'&'#1%&'&7676731#1&'6731#1&'6731#1&'S ----````~ !lQ'((''(('@@5Pc7671167632#"'&'&'%211#"'&'&5476763271167654'&'&#"352711654'&#"3!"<=CC=<"!!"<=CC=<"!  ####  F::$""$::FF::$""$::F`   """"`   ESao&'1#111131676751477165514'&'#14'&#"#14'&#"#153#3#1&'673#3#1&'673#3#1&'67p      0H \  \   H@@)D^k671167!11312##!&'&'#1&'&'53#351#1&'6731514'&##1"'"1113312765514'&##676'&'"PD--   ))"@  @   `  P"--D  ))"`@  @ @ q2 ,2 ^ 4 2C   > 2C d ,u XY . &  Version 773.01953125 (Font Awesome version: 6.5.2)The web's most popular icon set and toolkit.Font Awesome 6 FreeFont Awesome 6 Free Solid-6.5.2https://fontawesome.comFont Awesome 6 Free SolidFontAwesome6Free-SolidCopyright (c) Font AwesomeSolidVersion 773.01953125 (Font Awesome version: 6.5.2)The web's most popular icon set and toolkit.Font Awesome 6 FreeFont Awesome 6 Free Solid-6.5.2https://fontawesome.comFont Awesome 6 Free SolidFontAwesome6Free-SolidCopyright (c) Font AwesomeSolidq      "# !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijkl exclamationhashtag dollar-sign0123456789 less-thanequals greater-thanabcdefghijklmnopqrstuvwxyzfaucet faucet-driphouse-chimney-window house-signaltemperature-arrow-downtemperature-arrow-uptrailerbacteria bacterium box-tissuehand-holding-medical hand-sparkles hands-bubbleshandshake-simple-slashhandshake-slashhead-side-coughhead-side-cough-slashhead-side-maskhead-side-virushouse-chimney-user house-laptop lungs-virus people-arrows plane-slash pump-medical pump-soap shield-virussinksoap stopwatch-20 shop-slash store-slashtoilet-paper-slash users-slashvirus virus-slashvirusesvest vest-patchesarrow-trend-downarrow-trend-uparrow-up-from-bracket austral-sign baht-sign bitcoin-signbolt-lightning book-bookmark camera-rotate cedi-sign chart-column chart-gantt clapperboardclover code-compare code-forkcode-pull-request colon-sign cruzeiro-signdisplay dong-signelevatorfilter-circle-xmark florin-sign folder-closed franc-sign guarani-signgunhands-clapping house-userindian-rupee-signkip-sign lari-sign litecoin-sign manat-sign mask-face mill-sign money-bills naira-signnotdefpanorama peseta-sign peso-signplane-up rupiah-signstairstimeline truck-frontturkish-lira-signvaultwand-magic-sparkles wheat-awnwheelchair-movebangladeshi-taka-sign bowl-riceperson-pregnant house-chimney house-crack house-medical cent-sign plus-minussailboatsectionshrimpbrazilian-real-sign chart-simple diagram-nextdiagram-predecessordiagram-successor earth-oceania bug-slashfile-circle-plus shop-lock virus-covidvirus-covid-slashanchor-circle-checkanchor-circle-exclamationanchor-circle-xmark anchor-lockarrow-down-up-across-linearrow-down-up-lockarrow-right-to-cityarrow-up-from-ground-waterarrow-up-from-water-pumparrow-up-right-dotsarrows-down-to-linearrows-down-to-peoplearrows-left-right-to-line arrows-spinarrows-split-up-and-leftarrows-to-circle arrows-to-dot arrows-to-eyearrows-turn-rightarrows-turn-to-dotsarrows-up-to-line bore-holebottle-droplet bottle-water bowl-food boxes-packingbridgebridge-circle-checkbridge-circle-exclamationbridge-circle-xmark bridge-lock bridge-waterbucketbugsbuilding-circle-arrow-rightbuilding-circle-checkbuilding-circle-exclamationbuilding-circle-xmark building-flag building-lock building-ngobuilding-shield building-un building-userbuilding-wheatburstcar-on car-tunnelchild-combatantchildren circle-nodesclipboard-questioncloud-showers-watercomputer cubes-stackedenvelope-circle-check explosionferryfile-circle-exclamationfile-circle-minusfile-circle-question file-shield fire-burner fish-fins flask-vial glass-waterglass-water-dropletgroup-arrows-rotatehand-holding-hand handcuffs hands-boundhands-holding-childhands-holding-circleheart-circle-boltheart-circle-checkheart-circle-exclamationheart-circle-minusheart-circle-plusheart-circle-xmarkhelicopter-symbol helmet-unhill-avalanchehill-rockslidehouse-circle-checkhouse-circle-exclamationhouse-circle-xmark house-fire house-flaghouse-flood-water$house-flood-water-circle-arrow-right house-lockhouse-medical-circle-check house-medical-circle-exclamationhouse-medical-circle-xmarkhouse-medical-flag house-tsunamijar jar-wheatjet-fighter-up jug-detergent kitchen-set land-mine-on landmark-flag laptop-file lines-leaninglocation-pin-locklocustmagnifying-glass-arrow-rightmagnifying-glass-chartmars-and-venus-burstmask-ventilatormattress-pillow mobile-retromoney-bill-transfermoney-bill-trend-upmoney-bill-wheatmosquito mosquito-netmound mountain-city mountain-sunoil-well people-group people-linepeople-pullingpeople-robbery people-roofperson-arrow-down-to-lineperson-arrow-up-from-lineperson-breastfeeding person-burst person-caneperson-chalkboardperson-circle-checkperson-circle-exclamationperson-circle-minusperson-circle-plusperson-circle-questionperson-circle-xmarkperson-dress-burstperson-drowningperson-fallingperson-falling-burstperson-half-dressperson-harassingperson-military-pointingperson-military-rifleperson-military-to-person person-rays person-rifleperson-shelterperson-walking-arrow-loop-leftperson-walking-arrow-right&person-walking-dashed-line-arrow-rightperson-walking-luggageplane-circle-checkplane-circle-exclamationplane-circle-xmark plane-lock plate-wheatplug-circle-boltplug-circle-checkplug-circle-exclamationplug-circle-minusplug-circle-plusplug-circle-xmark ranking-star road-barrier road-bridgeroad-circle-checkroad-circle-exclamationroad-circle-xmark road-lock road-spikesrug sack-xmarkschool-circle-checkschool-circle-exclamationschool-circle-xmark school-flag school-lock sheet-plastic shield-cat shield-dog shield-heart square-nfisquare-person-confined square-virus staff-snakesun-plant-wilttarp tarp-droplettenttent-arrow-down-to-linetent-arrow-left-righttent-arrow-turn-lefttent-arrows-downtentstoilet-portabletoilets-portable tower-celltower-observation tree-citytrowel trowel-brickstruck-arrow-right truck-droplet truck-fieldtruck-field-un truck-planeusers-between-lines users-line users-raysusers-rectangleusers-viewfindervial-circle-check vial-viruswheat-awn-circle-exclamationworm xmarks-lines child-dresschild-reachingfile-circle-checkfile-circle-xmarkperson-through-window plant-wiltstapler train-tramtable-cells-column-locktable-cells-row-lockmartini-glass-emptymusicmagnifying-glassheartstaruserfilmtable-cells-large table-cells table-listcheckxmarkmagnifying-glass-plusmagnifying-glass-minus power-offsignalgearhouseclockroaddownloadinboxarrow-rotate-right arrows-rotaterectangle-listlockflag headphones volume-off volume-low volume-highqrcodebarcodetagtagsbookbookmarkprintcamerafontbolditalic text-height text-width align-left align-center align-right align-justifylistoutdentindentvideoimage location-pincircle-half-strokedroplet pen-to-squarearrows-up-down-left-right backward-step backward-fastbackwardplaypausestopforward forward-fast forward-stepeject chevron-left chevron-right circle-plus circle-minus circle-xmark circle-checkcircle-question circle-info crosshairsban arrow-left arrow-rightarrow-up arrow-downshareexpandcompressminuscircle-exclamationgiftleaffireeye eye-slashtriangle-exclamationplane calendar-daysshufflecommentmagnet chevron-up chevron-downretweet cart-shoppingfolder folder-openarrows-up-downarrows-left-right chart-bar camera-retrokeygearscomments star-halfarrow-right-from-bracket thumbtackarrow-up-right-from-squarearrow-right-to-brackettrophyuploadlemonphone square-phoneunlock credit-cardrss hard-drivebullhorn certificatehand-point-righthand-point-left hand-point-uphand-point-downcircle-arrow-leftcircle-arrow-rightcircle-arrow-upcircle-arrow-downglobewrench list-checkfilter briefcaseup-down-left-rightuserslinkcloudflaskscissorscopy paperclip floppy-disksquarebarslist-ullist-ol strikethrough underlinetable wand-magictruck money-bill caret-downcaret-up caret-left caret-right table-columnssort sort-downsort-upenvelopearrow-rotate-leftgavelboltsitemapumbrellapaste lightbulbarrow-right-arrow-leftcloud-arrow-downcloud-arrow-up user-doctor stethoscopesuitcasebell mug-saucerhospital truck-medicalsuitcase-medical jet-fighterbeer-mug-emptysquare-h square-plus angles-left angles-right angles-up angles-down angle-left angle-rightangle-up angle-downlaptop tablet-button mobile-button quote-left quote-rightspinnercircle face-smile face-frownface-mehgamepadkeyboardflag-checkeredterminalcode reply-alllocation-arrowcrop code-branch link-slashinfo superscript subscripteraser puzzle-piece microphonemicrophone-slashshieldcalendarfire-extinguisherrocketcircle-chevron-leftcircle-chevron-rightcircle-chevron-upcircle-chevron-downanchorunlock-keyholebullseyeellipsisellipsis-vertical square-rss circle-playticket square-minus arrow-turn-uparrow-turn-down square-check square-pensquare-arrow-up-rightshare-from-squarecompasssquare-caret-downsquare-caret-upsquare-caret-right euro-sign sterling-sign rupee-signyen-sign ruble-signwon-signfile file-linesarrow-down-a-z arrow-up-a-zarrow-down-wide-shortarrow-up-wide-shortarrow-down-1-9 arrow-up-1-9 thumbs-up thumbs-downarrow-down-long arrow-up-longarrow-left-longarrow-right-long person-dresspersonsunmoon box-archivebugsquare-caret-left circle-dot wheelchair lira-sign shuttle-spacesquare-envelopebuilding-columnsgraduation-caplanguagefaxbuildingchildpawcubecubesrecyclecartaxitreedatabasefile-pdf file-word file-excelfile-powerpoint file-image file-zipper file-audio file-video file-code life-ring circle-notch paper-planeclock-rotate-leftheading paragraphsliders share-nodessquare-share-nodesbombfutboltty binocularsplug newspaperwifi calculator bell-slashtrash copyright eye-dropper paintbrush cake-candles chart-area chart-pie chart-line toggle-off toggle-onbicyclebusclosed-captioning shekel-sign cart-pluscart-arrow-downdiamondship user-secret motorcycle street-view heart-pulsevenusmarsmercurymars-and-venus transgender venus-double mars-double venus-mars mars-strokemars-stroke-upmars-stroke-rightneuter genderlessserver user-plus user-xmarkbedtrain train-subway battery-fullbattery-three-quarters battery-halfbattery-quarter battery-empty arrow-pointeri-cursor object-groupobject-ungroup note-stickyclonescale-balancedhourglass-starthourglass-half hourglass-end hourglasshand-back-fisthand hand-scissors hand-lizard hand-spock hand-pointer hand-peace trademark registeredtv calendar-pluscalendar-minuscalendar-xmarkcalendar-checkindustrymap-pin signs-postmapmessage circle-pause circle-stop bag-shoppingbasket-shoppinguniversal-accessperson-walking-with-caneaudio-description phone-volumebraille ear-listenhands-asl-interpretingear-deafhandseye-low-vision font-awesome handshake envelope-open address-book address-card circle-userid-badgeid-cardtemperature-fulltemperature-three-quarterstemperature-halftemperature-quartertemperature-emptyshowerbathpodcastwindow-maximizewindow-minimizewindow-restore square-xmark microchip snowflakespoonutensils rotate-left trash-canrotate stopwatchright-from-bracketright-to-bracket rotate-rightpooimagespencilpenpen-clip down-long left-long right-longup-longfile-penmaximize clipboard left-rightup-down circle-down circle-left circle-right circle-upup-right-from-squaresquare-up-right right-leftrepeat code-commit code-mergedesktopgem turn-downturn-up lock-open location-dotmicrophone-linesmobile-screen-buttonmobile mobile-screen money-bill-1 phone-slashimage-portraitreply shield-halvedtablet-screen-buttontablet ticket-simple user-largerectangle-xmark down-left-and-up-right-to-center"up-right-and-down-left-from-centerbaseball-bat-ballbaseball basketball bowling-ballchess chess-bishop chess-board chess-king chess-knight chess-pawn chess-queen chess-rookdumbbellfootball golf-ball-tee hockey-puck broom-ball square-fulltable-tennis-paddle-ball volleyball hand-dotsbandagebox boxes-stackedbriefcase-medicalfire-flame-simplecapsulesclipboard-checkclipboard-listperson-dots-from-linednadolly cart-flatbed file-medical file-waveform kit-medicalcircle-h id-card-clip notes-medicalpalletpillsprescription-bottleprescription-bottle-medical bed-pulse truck-fastsmokingsyringetablets thermometervialvials warehouse weight-scalex-raybox-open comment-dots comment-slashcouchcircle-dollar-to-slotdove hand-holdinghand-holding-hearthand-holding-dollarhand-holding-droplet hands-holdinghandshake-anglehandshake-simple parachute-boxpeople-carry-box piggy-bankribbonrouteseedling sign-hangingface-smile-winktapetruck-ramp-box truck-moving video-slash wine-glassuser-large-slashuser-astronaut user-check user-clock user-gearuser-pen user-group user-graduate user-lock user-minus user-ninja user-shield user-slashuser-taguser-tie users-gearscale-unbalancedscale-unbalanced-flipblender book-opentower-broadcastbroom chalkboardchalkboard-userchurchcoins compact-disccrowcrowndice dice-five dice-fourdice-onedice-six dice-threedice-twodivide door-closed door-openfeatherfroggas-pumpglassesgreater-than-equal helicopterinfinity kiwi-birdless-than-equalmemorymicrophone-lines-slashmoney-bill-wavemoney-bill-1-wave money-checkmoney-check-dollar not-equalpalettesquare-parkingdiagram-projectreceiptrobotrulerruler-combinedruler-horizontalruler-verticalschool screwdriver shoe-printsskull ban-smokingstoreshopbars-staggered stroopwafeltoolboxshirtperson-walkingwallet face-angryarchway book-atlasaward delete-left bezier-curvebongbrush bus-simplecannabis check-doublemartini-glass-citrusbell-conciergecookie cookie-bite crop-simpletachograph-digital face-dizzycompass-draftingdrum drum-steelpanfeather-pointed file-contractfile-arrow-down file-export file-import file-invoicefile-invoice-dollarfile-prescriptionfile-signature file-arrow-upfill fill-drip fingerprintfish face-flushedface-frown-open martini-glass earth-africaearth-americas earth-asia face-grimace face-grinface-grin-wideface-grin-beamface-grin-beam-sweatface-grin-heartsface-grin-squintface-grin-squint-tearsface-grin-starsface-grin-tearsface-grin-tongueface-grin-tongue-squintface-grin-tongue-winkface-grin-winkgrip grip-verticalheadphones-simpleheadset highlighterhot-tub-personhoteljoint face-kissface-kiss-beamface-kiss-wink-heart face-laughface-laugh-beamface-laugh-squintface-laugh-winkcart-flatbed-suitcase map-locationmap-location-dotmarkermedalface-meh-blankface-rolling-eyesmonument mortar-pestle paint-rollerpassport pen-fancypen-nib pen-ruler plane-arrivalplane-departure prescription face-sad-cry face-sad-tear van-shuttle signatureface-smile-beam solar-panelspasplotch spray-canstampstar-half-strokesuitcase-rolling face-surprise swatchbookperson-swimming water-ladder droplet-slash face-tiredtoothumbrella-beach vector-squareweight-hangingwine-glass-emptyspray-can-sparkles apple-wholeatombonebook-open-readerbraincar-rear car-battery car-burstcar-sidecharging-stationdiamond-turn-right draw-polygon laptop-code layer-grouplocation-crosshairslungs microscopeoil-canpoopshapes star-of-lifegauge gauge-high gauge-simplegauge-simple-highteeth teeth-open masks-theater traffic-light truck-monster truck-pickup rectangle-adankh book-bible business-timecitycomment-dollarcomments-dollarcross dharmachakraenvelope-open-text folder-minus folder-plusfilter-circle-dollargopuramhamsabahaijedibook-journal-whillskaabakhandalandmarkenvelopes-bulkmenorahmosqueomspaghetti-monster-flyingpeaceplace-of-worshipsquare-poll-verticalsquare-poll-horizontalperson-praying hands-praying book-quranmagnifying-glass-dollarmagnifying-glass-locationsockssquare-root-variablestar-and-crescent star-of-david synagogue scroll-torah torii-gatevihara volume-xmarkyin-yang blender-phone book-skull campgroundcatchair cloud-moon cloud-suncowdice-d20dice-d6dogdragondrumstick-bitedungeonfile-csv hand-fistghosthammerhanukiah hat-wizard person-hikinghippohorsehouse-chimney-crack hryvnia-signmaskmountain network-wiredotterringperson-runningscrollskull-crossbonesslashspider toilet-papertractor user-injured vr-cardboard wand-sparkleswind wine-bottlecloud-meatballcloud-moon-rain cloud-raincloud-showers-heavycloud-sun-raindemocratflag-usa hurricane landmark-domemeteor person-booth poo-stormrainbow republicansmogtemperature-hightemperature-low cloud-bolttornadovolcano check-to-slotwaterbaby baby-carriage biohazardblog calendar-day calendar-week candy-canecarrot cash-registerminimizedumpster dumpster-fireethernetgiftschampagne-glasses whiskey-glass earth-europe grip-linesgrip-lines-verticalguitar heart-crack holly-berry horse-headiciclesigloomittenmug-hot radiationcircle-radiationrestroom satellitesatellite-dishsd-cardsim-cardperson-skating person-skiingperson-skiing-nordicsleigh comment-smsperson-snowboardingsnowmansnowplow tenge-signtoiletscrewdriver-wrench cable-carfire-flame-curvedbacon book-medical bread-slicecheesehouse-chimney-medicalclipboard-usercomment-medicalcrutchdiseaseegg folder-treeburgerhand-middle-finger helmet-safety hospital-userhotdog ice-creamlaptop-medicalpager pepper-hot pizza-slice sack-dollar book-tanakh bars-progresstrash-arrow-uptrash-can-arrow-up user-nurse wave-square person-biking border-all border-noneborder-top-leftperson-diggingfanicons phone-flipsquare-phone-flip photo-film text-slasharrow-down-z-a arrow-up-z-aarrow-down-short-widearrow-up-short-widearrow-down-9-1 arrow-up-9-1 spell-check voicemail hat-cowboyhat-cowboy-sidecomputer-mouseradio record-vinyl walkie-talkiecaravanfontawesome/inst/fontawesome/webfonts/fa-v4compatibility.ttf0000644000176200001440000002512014605646413024173 0ustar liggesusers  OS/2OP(`cmap"$glyfXXhead(ԉ6hhea$hmtxGlocad@Pmaxp0 nameB'EQ#$}postV'E%_< 1dž1dž@@@''LfGLfAWSMAzG> @ @@@@@'@@@'@@> AGf~ #>ILV^acxzAGe} #>HLV^`cuz}{zq`_\?:-& , R `*2<Bbb  T $ . v , \ p: '.5!!!"13!1276514'&#'17''3171'#17`@ @  ZZZZZZ&ZZZZ&ZZZZ @  z L: :)6711671167&'&'327&'&767''66RR66''  $$$$3!87;;-R6666R-;;78! s  a "1311#151&'&1176751311#11327716'&'#151311771654''1&1#15131676'' @  `@ @`  @ @ `@ @`  @ @`  @ @ `@ @`  @ @ `@;3#31''11''1&771'1&767#3#&'516761716111X 'W W'  'W W'  'W W'  'W W' 96111#1&'51676173#31''11''1&771'1&767 W'  'W 'W W'  W'  'W 'W W' +&#"1311#11327716'&'#15131676'' h 88 h h 88 hp    pp    p<D+%654''1&1#151&'&117675131177p    pp    p h 88 h h 88 h 7Mdz2111!12#!1&'&'147632111#"'&551476375#"'&551476322111#"'&551476375#"'&55147632   p"      @        "P @ @ @   ` ` `  'U'1#"'&551#1"'&5514763315147632'#3#"13312##1&'&'16767312#z{{{ {     @@@ @ @))@ V{{{  { > @ >   ))  S11327711767514'&##111!16767514'&#"1!1&'1673127654'&##` * ) ""@"  p p) *  """p p@  'U'1#"'&551#1"'&55147633151476323#3276514'&##1"'&54763311#1"'&54763{{{ {     @@@ @ @))@ V{{{  { > @ >   ))  2$7531513171#1514763251&'&#&1#113PtWi' BBb"&Y+aK\w7'11176771677167514''1&##1"''1&'&7716176''1&7716''1"#&'11165!671167632#"'&'&': : +"  G55 0!"<=CC=<"!!"<=CC=<"! ('      ((@?8-  2F::$""$::FF::$""$::F"+E#3#5131%111!1676751&'&'!5!151!%111!1676751&'&'!p    `p    ` ` @  @  @ @  @  Y#3#177111'1&131676''17111316751&'&1'171176751&'#111'1716'&'Ȑ (OO(  (OO(  (OO(  (OO(  (OO(  (OO(  (OO(  (OO(   :Cc7113277171654''1'1&#"1113271654''1&#"7'171113277171654''1'1&#"1113277171654''1'1&#"1&&&&&&#}#iiii#8998`8998&&&&#}#8iiii"99889988@#-7A\w111!167671&'&'!#3#51'55316711671#7&'11&'31471167632#"'&'&571#13367&'#151&'#1@@@@@@@@@@@L@@@@@@@00D-J]p7671167632#"'&'&'%4'11&#"32765671167&'716'&1"1"14'11&#"327652711654'&#"3%4'11&#"32765!"<=CC=<"!!"<=CC=<"!   @ @P   P  `   F::$""$::FF::$""$::F          !C!!!5167611'&'51!1"'&54763211#!11''1&5477161! @@` `  ` `@`@ ` `@   @ ` `@,5671167!11!1&'&'4'11&#"32765!!!1!1@   @@  @p,5671167311#1&'&'4'11&#"32765#3#131   P  @+';&'1111771176''1716'&''1'1111'1&#6D o o D5 vVi   n II n 22l U x8767116727676'&'&'1#11!1676751&'&'#15"  "",=)(@0"   %()=00c.6''1&#"1311##1"13316767513167^   X P P6%$X      $%6 c.%1#"''1&76731514'&##1"'&551476331131^   X P P6%$Xq     $%6;111!1&'&'16767!55&'#1111327711367@@!B$B! @牉 !B$B!@P471163332##1312##11''1&767312767#1"'&5476331&'&###"'&5 @ 8# $ !!.  P   @     ,g     ''Nqx#"''1&76761147632171676471163311312##1&'&771#1"'&511'&''1#11'&'&77171673#3'1  X    X  J3  J3 ` @ X @ ((( `  $. $  ` I  I     ((@'=Si#"''1&767611476321716763#32##1"'&547633#32##1"'&547633#32##1"'&547633#32##1"'&54763  X    X    ``` `      `  $. $  `         @'=Si#"''1&76761147632171676"'11&54763312##5"'11&54763312##5"'11&54763312##5"'11&54763312##  X    X     ` `     `  $. $  `         '(Sf27716'&'&114'&#"1'1&'&13%&17711#1"33327654'&##1514''611'&'&76777677165&'&' X    X #0   00  !    1%% `  $. $  `  4   `   q  B$%% D"71327716'&'#114'&##1"1#1   H @ Hq    C"6''1&#"1311331276513167>   H @ H      c"7''1&5477161!121#!11      "   H @ Hc"%771654''1&1!1"13!11O    "   H @ Hb211171611716113167675167631#1"'&5511'&'&76771511'&'&76771514763` w  w  @4$$  66N`   )  )  #" '" '""5  N33     6 0=JW67311312#!1"'&54763317!!!1!1&'&'16751&'316751&'316751&' x `  `g```   n@@ 3'71#731'#3!17%3#3'1#"'1&771633121WWWXHHH92I8  p p x]]]]MMMM}0MM( 6I\o%6711671167&'&'&'#01111111111367673'211#"'&547633211#"'&547634711632#"'&5H9:"""":9HH9:""/ ,&#08    `   //::////:E4%         %%+,%2W" , % 4; J% o V} J% d D7 X . :{ oFont Awesome v4 Compatibility RegularRegularFont Awesome v4 Compatibility Regular-6.5.2Version 773.01953125 (Font Awesome version: 6.5.2)FontAwesomev4Compatibility-RegularFont Awesome v4 Compatibilityhttps://fontawesome.comThe web's most popular icon set and toolkit.Copyright (c) Font AwesomeFont Awesome v4 Compatibility RegularRegularFont Awesome v4 Compatibility Regular-6.5.2Version 773.01953125 (Font Awesome version: 6.5.2)FontAwesomev4Compatibility-RegularFont Awesome v4 Compatibilityhttps://fontawesome.comThe web's most popular icon set and toolkit.Copyright (c) Font Awesome'      !"#$%&' location-dotup-down-left-right"up-right-and-down-left-from-center down-left-and-up-right-to-centerup-down left-right chart-columnright-from-bracketup-right-from-squareright-to-bracket facebook-fearth-americas bars-progressmaximizewand-magic-sparkles money-bill-1 gauge-high right-lefttablet-screen-buttonmobile-screen-buttonstar-half-strokeunlockturn-up turn-downsquare-up-rightindian-rupee-signarrow-down-z-aarrow-down-short-widearrow-down-wide-shortarrow-down-9-1 down-longup-long left-long right-longturkish-lira-sign trash-cangem comment-dotsfontawesome/inst/fontawesome/webfonts/fa-brands-400.ttf0000644000176200001440000063035014605646413022631 0ustar liggesusers  OS/2_y^v(`cmap2 :glyfd%8head) ԉ6hheaRA$hmtxlloca0pmaxpDQ name 41postIv6~_< 1Dž1DžO'LfGLfAWSM!KB @@ @@@@@@@@@@@@@@@@ @@@@ @ @  3@$ @ @@@ p@@@@ @ @@@@@@,@@@@@ @  @      @ @h@@P    @ @@@@@ @@ @@ @ E@@@@@ @@@ @@$$ !%+9Zabcdefghijklmnopqrstuvwxyz'1'S'T'U'W'IRW@`:J1p +/=A\cq|gi(*6L^aknp~\u} !#%1MRWY,16A?B1]{=B!#*0<abcdefghijklmnopqrstuvwxyz'1'S'T'U'W'IRUw@`:J0p +-;@\cq{gi(*6;UZfgjkprsy 017:K^`cmp|\hx#%&MRWY ,16A?B0]z4? )   Kz t?$QF76+) lJF) tsrji^\[ZWL><; e a ] \ E : 6 2 ) '     K   v m j g e ` K J C : . , $ # w p M F 8 2VRL86vr@."rrld !"#$%&'()*+,-./x 8!!#%*+09<Zaabbccddeeffgghhiijjkk ll!mm"nn#oo$pp%qq&rr'ss(tt)uu*vv+ww,xx-yy.zz/'1'1'S'S'T'T'U'U'W'W''0123II4RR5UW6w9GIJ@@K``LMN::OJJPQRS01TppVWZ \^++b-/c;=f@Ai\\kcclqqm{|npggiisuvwz~((**66;<UUZZffgijjknpqrrsty~ 00x1277:>KL^^`ackmnpp|~ \\hux}+1367<CEHLYcdfghklwx| !##%%&1MMRRWWYY ,,1166AA??BB01]]z{4=?B8 dd@    P @<  00 0x !p""$%x'('(*/`/001@123@34578::;=t?@XBBC\CDEIJlL0LM|NQRTX[\H]^L^`abcdchLmno|or4sXtu<uvwxyHz0|<|}l8p4||p , 0d8,$(8pTp$Ǵ,,̨ H<l 0ـ0@d0d,hhLXtL0 @  \<L`$hPt ( ""$0%l&'*-.0,1 455l6$68h9x9<=?@BXBD$GGI,JMMNORTU8WpXLYY\]_H`acldefghTjHlPlm`s,tuvwx`xy{$|}(X@ Xxt DpHT@xT@pDH`ńtxh,(0tլ8ٌ4<tl<4lHh HLp #$$%P&H&(\*$+,X./013,4L5687`89;=>?A8C8DtEFIK,KMP\R XbdHe4hk\m`qlrLsstuw x<zz| |},},<04P@H0\8l\0Lʸ<LЬԤհ|D h48 5777'13#3'17'17#3#17%671167!11!1&'&'@ZZZZ'ZYYYYY3YZ     ::   `  M"4'11&#"132765676'&'@       `js11131716761312##11312##11'&'&771#11'&'&771#1"'&547633171#1"'&54763317167673171# _   : E: E   _   : E: E  __ ;E ;   E ;E ;   E 4~2111230111''1&1211#"'&5510#01#111&'&'&'&76767676'&'&''11101&'&'&'&7676767514763 0  /0 1     1 1   $       ! #       # "/65114'&#"1327&'&767&'&767w @    I @ $$$$$$$$J211171611''11#"'&5511'&'&76771'1&'&76761514763 p  rs  p  o  rr  p  C DE C B EE C 14'11&#"1#1"331132765513127654'&##15      p      @,6711671&'&'57111676751&'&'--DD----DD--))))D----DD----D`)))))&'&17711#1"33327654'&##1`  .@ `` @ @    `@0"1#"'&54771671312#!1&'&77167&'&'" +<>())  "` *)(><+  ""@D47116331131#1"'&''1&76761316767&'&'#1&'&771#1"'&5  :&''&:O   Oh   x'&::&'  x 96'11&'&1331132765513127654'&##1514'&#"1#17       kr  P P   @?67312##1131#1"'&''1&76761316767&'&'#1"'&77! r:&''&:S   S !  p'&::&'   @#>6'11&'&101016767&'&'711#"'&'&54767632  %--DD--*+@?   k  +9D----DB,-K  D471163!11'&'&71#1"'&5       P @"Dc&'11&'#13167674'&'673#3#1&'&'67673101013101015011101#10101&'&'6767310$%6 6%$#$%6@6%$#@   6%$$%65$ 6%$$%6 $5@@81132767654'&'&#"&'11&'67671'&'&77@   XA+*--DD--$ @  -,BD----D7*  K1111'%1&'67%16}   @ n     @@+"113!127654'&#!"113!127654'&#!0 `  ` @     11117%167&'%1&   @ n     0<I6711673111132765514771676551&'&'#132765676'&'P +'  *$%6 6%$  P   "0  !6%$$%6 P]112#&'&'&'6767671&'&'&'6767632113276551&'&'&'&767R6666R H9:"""":9HH9:"")-$36%$$%6+    66R@  66RR66  "":9HH9:"""":9H )!!$%66%$ P   R66$$$$!(&'11767713117676''1#3#71 x(   (x*HH`  LL  ` @/>11113167674'&'67&'&'##3#51313#3#15@6%$$%6`````````$%6#"06%$@, "327632#"'&'&767632#"'I1<<1//1<<1 DVVD,,DVVD 1//1@@1// AA-9999,BB +67116731#1&'&'3#3#1316767&'&'`?2332?`````D----D`32??23@--DD--@511113127654'&##1513127654'&##1513127654'&##@       @-111132765513127654'&##1513127654'&##@        :116767#1"'&54763312&'&'&'676767'&'D----D;++ }  >>Z?2332?X=  ,?`--DD--$#8  X9:32??237  (2%53276551514'&#"1!1514'&#"13276551!@         @1"113311#1"3!127654'&##113127654'&##  ``  ``     @  @*2111&'&'51476321676714763  --DD--  ))  D----D   )) B565114'&#"11514'&#"1132765517117676''177 .   A j / x kC  ˍ @2111312##1"'&514763@       ,617161#"'&511#"''11#"'&5167      $611476321'11#"'&5167    ( = 5"1132767654'&'&#11#"'&'&'6767632+%%%%++%%%%+45;;5445;;54`%&**&%%&**&%=3333==3333=@.67116731#11#"'&55153#36767&'&'#1`D----D`  @```))``--DD--` ))@71167'1&7676167&'&'&'&'&'6767671'&''@--D,#H G--DD--5D?2332??2350 .D--V  U*7D----D"32??2332?V=9  8B+;111132765513117676''16767&'&'##3#5131@  _g T(()=pppppp""   x$#.=)(""Dh013'1111&'&'&'&#&'&767627676'&'&'01&#&'&'&'&71'1676'&'&'711&c 8 :7E    9  8  :7E    9 W   $@     $@  #"1133113276513127654'&##        `  *2111676751476321&'&'514763  $%66%$  66RR66  6%$$%6 R6666R 611116761&'1&767     9   B.6111167116761#&'11"'1&767 nUUn  QQ   $&   16'11&'&1'1&'&117677117676''17y  k     %&'11&113276551716'&'&1':      ז   &471163!11312#!1&'&71#1"'&5 @         L  ~011&'11&'0&'&'&'&74#1133233167&'&'&'&'&76767674'&'&'&'&'&'&711&'&7067676'&'41`    #/ ,=-3    &   !77D\CB @-* #"""  --&%     &D77 !98X5## ( $H_n767&'&'3#351#7&'11&#113127675531131&'&'&##1131#11316765##3#51311#11311#113''#11#17131'!!!1!127676'&'&'#3#1312#731'~  (OOOO"++-_((_k-,9997 "J   z@@67kk==;:pT G..[[[E>!! S+---K[  [[@:9n+43&%U21ge34 F%67&'&'276274'&767'71''11'&771'1&7637171632112.?>__>??>_)&2F:::;;:HHV5IV::::VW::& ,,,E))E,DD:7716767!1"1111!1676745454545 "!3GGCC13%$%%$,+   (I3!"<<<H2"",-9;22;%&2 ""210A@10B'1''1&77151117151611''11171'11'51477161151'1PPP_`PN_PNNP_Nd...88.\w.]8p/.ww./p8].w\6%&#"327654'&'%!1#3#51#1#"'&'&54767632517+    I555(  8   @@   N  [h776'&'&7&'&'&"#"#"#&0172323237676767676'4545456'&'11&''&76767&'&767676#11"'7&'11&'!11!16767##"#"'"'&5&545474763632322    C%)*(%)*(@[''''  E    -././Z@'''++'4&'&11767716'''716'&'&117676's   \\  \\\\      t {} }}}{  =JW4'"#&#&'&'171&'&'&'&''&'&#"#0'0'&11"#0116767'267671111"'&5017136765&'&'&'&767610'&76' ~ c &- /8     /%   2  _ X O66HH67"  /##  ,+88**4@ '   $ ,   %9   @y ")07>E%3#351#553153#351#3#351#3#351#3#351#3#351#'3#351#3#351#53#351#}}}}}}}}}}=}}}}}}}}}}}}}}}}}}}}}}}}}}}}IeHHHHIIIIIIIIIIII77111016'&'&#67676#1676776751'&'!1534@i;: 78M  9 !!5BDD&+??21:B97@@Y0$%4./E70/ i?4?A-Rax7531#"'&'&7116763671&#167674'%&#"16321&#"32731131514'#'&547632'&##113151312725676'&'##15131277#1'1#111317j9)+""      ^?' ''  $$$%4O)))  002      OY    L? A \\\\x@ _ "%''&5716'&''1414'716'&#'1"1&'716'&#1&'716'&1&'714'&1&''14'&1&#'1&'&1"''1&#"1#'1&1"##'1&11'1&10'1&1#1&10#1"101111111312113711771177101771223177120113277163176771236317657143671765'167176''1671276''1674371276''16571676''14771654'&1#"''1&'&1&'3125514#17131231&'6711#&'6731'77676''1311#1&7'476311&'77312#"'&'&'0'6767&'&'&'&##16713277111#1"1'6731&'"'&76311         %)(& -0  O  X 5   ?     +>)!! #            ## 6#    x#%$ $$$ T    / %(   2%"'1'&'&'&76761&7676513111D70100#!,-3X +$'4)) ''21.-Z] 3%5!1513113155#3#13@}}}@n9f%''"'&763716767714545&'&&#&3!1010127716'&'7"#112#1130101312765&'&'<>A@( j  23 $$5"C"A  (  c  6#$+!!!7676767!131&'&'&'&501!16'JJ !))U8 %YQN88 @## G&&,8 '*+,(DZ%''&#"11327716'73312745'1&##1"''&##1"11331277145#3#"133127716'&#'CoBCCCBBBmBm `+276767654'&'&'&#'71'1!31@     B/.`@    @./B 3#371%''#1'71t-vvvuuutg 9]' b%&511476'&'&'&767676776767676767676545&767676'&'&'74'&'&'! ,HAA   ""          c%,,,!"F$& &   !   9P`%#3#13127654'&#'#3#13127654'!!!1!167671&'&'#!1"'&514763!12#3#13127654'&#1:::: :::: !!!!?}:::: b  b  a!!!!b  *S\eny72767654''171654''1&111327655113"151&'&1'1&#11327716751&'67&'767&'67&''674'&'67&'367&'3767&'67&' uKdtJJ ee %@?? @ >  E+ :s UC++ ::, T  T $ RH2Yq1111676767&'&'&'&'11&5477111777276'&'&'01&311'167632''71654545'1511C66  66CC66  66C( g N   I//80+* "!!! <=[ 66CC66  66CC66 c--5! N +$% \=>h1D]p7#3#'1111#1'1311117131131713211#"'&547632711654'&'3111'&'&5476721151311#'11327654'&'#3#51#1#"'&7513113'5133#31#%%%&-&#$/   "   "" &&&&luuttvv,h    >f   fLF$AW% 5777'13#3'17'17#3#17%671167!11!1&'&'@ZZZZ'ZYYYYY3YZ     ::   `  3 3#3513#351'5'1151#117113SSSSIRRRR|yT p/AA/PII{{iLj"-8Zmx7"51&'#11331276551327654'&#&'51677674'K56'&'1327676'&'&'11#"'&'6763267&'11%"111&5632701716'&#"&'&1132765&'&'"5&##&551312751&'#1514'&##1"111#1"11133113276'V .   # "! #V''''2  #` + > $"l +  !;Z---  -""  ""k       =3@) t0BIb~74'&##1"'&771673167716'0#01#112331677145054'e#1133#371#%#1"10013167141#3#1"3013167716'&'01#3#10010131671417761#1101013013127  "   Q)3i4443,)[)\))) ) 7)))\)\ * )< f)!h)3Qz^))4^))))5Mcy1!1&'&'51676731'1&547632131716321311&'&#!1"1!1676751#"'&55147632131#"'&551676321((( IXK ('  @         X'(+'  EE  F   + ! ! ! ! LHZjz%11#1'&'&76711116705#1"76767673167676#01#01"'&''&'&7676"771633121#'"771633121##3127514##1"%451145&'&7674145   !< e 70)%-,+! 8.&""6,& pq/KD?, %&   + ->+  -+4(,     - (+[761311#"''1312777''1&##1716321#1"'216771633111#1"''1&#"1#1'1&547713 Mab L L baML  M%;;%M  L :: MabLJMaaMLM  M::M L:: ,111311!16767111#111&'&'3671167!11311--77-,7-,7--6$$$$6$$6$$6,11132771654''1&#"#11"'&547632###%00%##%00%""""%00%##%00%##""""3K]%11#'&''1&'&'01'"'&5676767267671%&'11&767476716'&'&'"1715-"", 1##&7))5%##& '2))0'0#"5/0&*E'(K5 V''CI??''0'&%>>L~.005J>/H`@?N>E&9DO\111111111''11'&''1'1511671'1717111111'%7731171'7'''17'1&761* + ED +   ^^^J +)))/)  *   4 '''{z'@c)))ma*MMMBooo U`S;_'&'&76767221231716763221#"'&''1&5476321511##'&'&54767632323214711651167654'&'0'&5&'&7416743436362"#"'&#&5"5&'05&7671#"'&'&541&5511"#"'&547716321#"#&''1167676'&'"'&'01&7&7476767231#&''1&747632167&'&'&76761"'&'676210#"''11_98 HJa,,W@>3$#*)$$  ##W8. >?J,,W@> 34U)0F? '011F? ')NPaaB@e//Y<=WWG" k!!&& "&'++'&!"%&!"&'++&'zD:IICC('c//W<>VWGF1#E>!%#0V#10#F?!$$ 'O6'&''1&'676321674'&'&'&7671'&'&5476761#"''11 ?"!!"?    S2  ?!!!!?   S2  -88=?88- EW.,+$ @-88?=88- EU0,,# 8AJ`~67&'11#"'&5476326731#"'&'&'&'3167%&'6767&''&'&'6767651'6776767676'&'&'671!&'&7677'1O"x""**//*+!"x"#..#ny##  !! !Z! !![..*)  )*..."    "  "" ""   )JS73#31#151315131513155#1131131131133#31#151#11#113151315131131#3#1315`  @ @@@@ `   @@@<111!167671&'&'!3111#11#1515151&567@@Z  @z EE   e!167671&'&'!1'11111001#&''1'1#111&'&771716763601320130131716767632@R,,, E67C -{`@@ ttt3))3t\\ 8AJu~ #&'&'76767'"#&7676765&560127'&563''6"'47674'&'#10101011101301'76'&771'1'171711'1111111'01"#0#'&'&"1&5676767&76'%6'&7356#"3471166'&'3#3256'&'"'&'&5&7620#00101AVU@@%      `\:!   ==   8  $%$' "":9HN> U   Y 0/.L%     _ME`3,-#%!  =  //*+&  H9:""(}(    )B7'6763271!171'171'171'171'1!11#"'&'&'&#&1:::   /********P/   #"  >0 88888888 /3 ? ELeq%6516'&7#1&'&'&'&6711216'011101701116#0111"711611101011111111111111111#13116"'1011111&1111111111717131'111030103&11�'&'&'&7&76'7167115132767614767716767716716767031167763160131727316'1127316001031116'"10105"1&#'111&'&''1111&51101411111110110&'&1&7011163&'4'11050111&510654#1'116'0111"7'4'&'&76711115111116767672&'&43011101010111016571671111016767670711110343670711116'11&77165654161#'111111&'11&'&'0151&'7'7111&'672'4'011101"54701111117716717&'&311011&'0151&'71171'1&'17677%0311016"101111654511&7011|       1)*              :C  $$&e  ##O8  \     #        '&55;%            ,)   /     x   "  *x )  %677167677163271631161001""##&'&55167676321&'&''1&'&'51476321#"'1'&731477145&7654'&#"67'3076744#"""331657410121076577145&''#3#117&'&''1&'&##13276767 ! .-5I-5,6$ *'"0$ " '+<o t "%1&&B4$$u %' %>*&% $%  2 1 &  ! )$. xP "+/Ym%211##1&'&'11116767311&'&'27676'&''&'&7676&'&##1"'16731#1172767&#"1L, #3[i7117ij8 ) ,VV+''+VJ' /$-    #:` (''%5E>ll>EE"0 &662]]26) (!%% ,iE - m111!167671&'&'!#11&'&'111167631121&'&'27676'&''&'&7676&'&'#1&'167311271167&#"#7#@@ "=G$  %FG%:991  &@H    @#.)HH)/. ##">>!$    FD  2;111!167671&'&'!71#1'11#171'1311713''#113@@)hhhz_KV/oubCO/&@TwwwbbZZ!3#311#1'11#171'131173#31#1GGGoGet(((*𑑼䅅N|c11&'&'01&"76'&'&#32767&'&"##"'&'11676'&'&7631&76731&767667676765254##01&'&'01'&'7670567&'&'&'&'�1'&7676'&276'&#&511471 '(0'67K 2E      9.%"1 1@   %   Y  , / '9    !'!!3  )# K      S@A^11"'&'67&'115167673#211111#1"'&'654'117167673#211111#1&'&'6767 3!""!3    3!""!3@"!32!"########"!23!"0I^111!1&'&'16767!116771'1&547&'3116771'1&547&'3116767&'&'@' 'w' '' 'w' '@ )2;D55!15131513151#11#11#11#11373#31#1573#31#1555311#73#31#15I%IIۓIIIIIIIIIJJJJJIIIIIII@IIIIIIIIIIIJJJJIII0%01&'&'47116767677&'11&''1%11*+??+* +G3' *+55+*__#?****?# 3 --MMJ3#3167630111"11111&'&'&'&'&'&'&'&'&'71'12767671116701070367676'&'&'&'&'ї"0110115111672111716'0145&'&'0'45&'&701410567676311636362123231111"011111#0"176'&''1&767011163716765110367&'&'&'01"#&'0111"'&'&1111&1101"'&#1131221111013676767674'&'#&'&'&'&767672165&'&'01"#&#&'#1&'&'&723236763310011111111031NN,           -N              +      +            3  ,**.-  -.**,  3h        ..      {21616110"1#"'&'"'&#)&'&'&'&'&'&'&'01&'&5&14771'1&7436567676767602171633#3#1'0#01"'01&110332767676701676767676767676543'1&771&'&'&'&"01"1''211#&'"'&'&'&76767676356676701'&'&'&'&'6767676767674'4'&'&567672767676'"#&#&#0"#&'"#&7474767656'&1&'&'&'&""#223'&767456'4'&'&'&'&'&'6767670167676013*&        &'         'E                                  , &  <  =  & ,- '! 3    L! ' -                DU111!167671&'&'!11#&'&'1#1&767511'14767676767&'&'"1@@>'')(;!;()6.13@T"#66! 4!+, O%&'11&'676511&'#11&'&551#11367675113171236767&'&'& ###>##  q""A%'<<%$#C "(>))))> G)) +-7''?**((B_'')Ǎ ))AA))*#171#15176767#151311317131131713V5PQp##FIqqE+*  &0;EMU]eow''1673771&'167'47'171&5''167716'1''167'17'7167'71&'67'1771&''671&771'11771'''71&'1717171&'"171767676'&'&'&#" !&{" !&  l "%!d ##&&1 ##&&222  19p""" !w910U*10..!!  ,,1  t!&" && &&=" !&[D1 "%!aG 22 @"! 521990U$$/000''@ c%"111&'32'&'11&'&'&763277676705765&'&'"5"'327676767654'&'&x.-3/ ,+20##5<%%  #$>1!!02+, /3-.D)89&  !!!" 1"#=: /.* )('44#$1 "!!!  &98)'5C!!!"13!1276514'&#11#167633511#167673511#167673x x !  x rr,o!!!1!1&'&'16767671162#&'&''&'##1#"'&551#1132765511317111030301216767&'&'8PP    !  $"! % ##"P'   *N  NN#$5oO $$:171&567671#1&''1&'&56767171&'6767tjh   q((q   hj!]    $$    ]!E111!167671&'&'!'71&5671#1&''1&'67171&'67@@55548 f 845@... }} .3_"1113!1276514'&#!671167!11!1&'&''71&5671#1&''1&'67171&'67@ @ @@55548 f 845  @ @R... }} .S111!167671&'&'!111&'2327"'&'7&'&551&'&567&767676701@@)*<9,/" #") @-*+  #  =1113151#1513151&21&#"1311#113167671&'&'!@b55~   TEN"G N@"5X!!!"13!1276514'&##3#5131'"'11&547632##3#516'&'1#151311316763  BBBC"   BBBC@1    hj ,u t}&'11&'!11!167674545&'6767&'676'&01&#"&'&#"'&'&#337#&'&'6767"7'432"'"'672#'&563''&76''&76''&76''&563'@        2--GF//3 [  `@  .    .    *+8F----F8+*7  :1101&'367&'&'327&'&'51&'67&567676767#"CBaZG K8$  %,'87B,/$ !(GDD--.,' 90 , % ;%&'11&'11&'51#1513151&21&#"1311#1167671"":9HH9:""56U55~   TEa??H9:"""":9H\CCN"G NFFd7#"5632'76'&7365&#11'4545"'&'4'&'&'&7632767&'&'4767&'&76016324767676767&'&'&'76'&'76'&76'&'76'&,BkDD..M    ,!!  !    L.-!"89F ! 3DDjU@@    F    0 #%  @@UF77 #p%1111"'676767670136767&'&'767676'&'&54767&'&767676'"01&'&'676767!!88E&# 9##++BP*) 5.!    G++!!88EE88!!E88!!   ,+B?'(,+=   + -3    >=PE88!!!!88Em!!!131'1&5476701674'&567636767&'&''&'&54767&'&'3167671&'&'@I   ".5 *)OB**##9%" # 2-+   =++'(>A++   @B[&'11&'!11!167676711671&'36767#15131&'&'5#151#1513151311311#@+)  9^,+#`@+  " ,+ s'@%&'&'67671&'&#6767#151355#11#1131131513151#12TR6666RN24 3!""!38m877888T3466RR6602 ""44""C88888888:7#3#13'&'11&'676#3#516'&'1#11311316767d]]]].]]]"# ]Z "D+)+)'(>Ch{711&'&54767%'"#"#'&'&'&747&5476726326763&'11&'#"'&#&'73176767'1167654'&'    &#$*)&&++%%)",-)'!(@$#""$0$"#S  w32-%%-2@1   2@3""++7 {"%#3#716'&##11#11#11#11'1!1aaa410 1'17131117171!171!171!171!@@@RtM pPP_),,aR5RH`t%6'&'&'51#11"51#11#"#&#12361'"#1232#1315123011315167676'&''271161111'"#555236'"#6- /11     @11=&%#>*OMNO4 :DCCD8.l  `jjj  1:A&'&'&'"#"#23012367676767674545&'&'551& %22++++22%  %22++++22% D%  %%  %֣QR3711##1&7712#'1&731277111#1"''167676331 A E,A -ܐ[ A ]!] B +1  zL  M  ;  /J&'11&'!11!16767&77101'1&73121##71111#1"''16767676331@ 1 . 0.B /B= / g`@ W6  7U !w  xj  *711'171'1717711'777'1711111'LUUUTTUTTTTUUUUTTpTTTTTTUTTU} "1%''17''1''1717#3#13!!!51#11!151##; w b'(g()))')~ UUU%T ((x%2[116767&'&'&'11&'67677&'476324'&#&#"#""7236776565454'#"#"#"'&'&'&'&54545476767676232321 !! 11 !! 1    L%'6%$$%6(%%'7%$$%6'%0 ""  "!  !"  "" 3! 11 !! 11 !    7'%%'6%$$$7'%%'7$$$%  !"  ""  ""  "",?!!!1!167671&'&'&'11&'67673&'11&'6767`  `     ` #2'#171111&'&'&'676767''131713113AAAA!!88EE88!!!!88EE88!!d""bbbcYE88!!!!88EE88!!!!88ES44"1!16716'"#!#3#'131DF D-hhhd ֓::11&'&'&551#1"'5147676763311311#117616 $; /  .G S  T!  ! D "!! s R  AR&'11&'!11!16767&'11&751#1"'5147676763311311#11761#@7  ,44 `@Z+  H4S(|.A%&7&'&&'&'6767676767&'&701'67116'11017?38  ,"#- 9 '7( !!C'*   *##771#15'51#1'51#153151b"""Բ|"@@9%&'67!&'67%776'&#"111&#"'1&#"111!1&'&'0001;@@;10?&'@'&?SSSUUS#;:KK:;# )s311327&'01&"32327110721256#&013&'1141&'&'&'6'&'&'0'&'&5456'&'&'#767676723117676767676'63112&'07676'&#&&'&7'2116'&#16&76767116743676#"'&'&'&'&711'&#&'&7116'45&7676767676761'&'76'&'&'&76767667676767767676726'&'&3"#0#6'&1'%11'&7676767672176723603116701676'"&'&'01&5&'    &+          )                         E  *% !     =      =          $                      )8GVet1111676767&'&'&'&'&&'6767'11&'&'6'11'676745767&'671167'&'&'11&'6E88!!!!88EE88!!!!88E.++7 :8322'L77 -z ??R :005R++A 4980 3%%$!!88EE88!!!!88EE88!!r8L0#" #!""02&'((-:T#%%;++% )):,%$ a%65&'&'"&'276767&'"'11&'476367&'&'"'&'&'&'67632#&'&'&#&#::W'0 ::W'/ 2#" )  +!"(+!!  ( !!"+W:: 0'W:: /'[   +,   &,})W!!!1367676760162131676725716'7#11312#1"6516731C  ?S 0:  k[I :NI ! @J<<<    FS5O!!!014!167671&'&'#1"'&'516763312711##1"'&'51676731PPS  S  Q  Q HGP  p   61111676767&'&'&'7'1&'&76727676E88!!!!88EE88!!!!88Esqqqq  !!88EE88!!!!88EE88!!♙      *T111731767676'516'&'&'&#1&3#351311676731#1&'&'1#1&'&'++KK++++KK++-333005M)*++KK++++KK++i@JC11X7Jat6'11&'&76'&7"'11&'11&'676763272167&'11&7676'117676'&'&11'&'&7676'&117676'7&76' ' 611J3-- >## C=>g..BA()/.AA)( %  *)4O!   V    !   &+DK20 3 33+,*!!+*!!+ $3++           )11&'6767&'67677&'11&'51()B899Z)A5+  ,5BB)(Z998TAB!C]^CC'(00('W!BATCC^]C\%11'11&'11&'&5476767'&'667#&'&'66765&'&'&7&7676'"'676760/; 1()6$$ ""$#;"!  < .""!! ''-2 >$# 3 6$+;%%.&& A)%"(:7!!!1##1151#1"'&555!!!51!15!!!51!1%!!!1!1514'&'dWdddd[tZZUUnUUF&'11&'!11!16767#"'&'05&'&'"'1676341676767676'&6@B-   %  B2?`@T33 7`- N?.R'9Oaw711#"'&'67673134711671&'&557"'11&547671#211#1&'&'676334711632#15#11&'&'516767211&'&'5135"'11&'676731##^   /    /   /  v  v   /    /   /  v  v   /  v  v   /    /   /  v  v   /     P[h&'&'67&'&'&'47632321&'232763012171'1&'&56323276301217167677327&''716767&'1111&'&'&'676767#&'11&'11&'676767>eee6 !R ;U8./M/!  L @@@%"AA0=!!88EE88!!!!88EE88!!  65BB56  65BB56 32@/(L& 6,[G& y -00<8.fE88!!!!88EE88!!!!88EB56  65BB56  65B)%7&'&'676711717''71&'5171DDDY8955T7""&%;D%(F2#  ((96(' + %'T!+ a"7'1#111317674'73179998`j'^ & ##B]]]h]3ZS"# &.%11&'&'&'6767671&676767#15131@AmE88!!!!88EeAC/::,++,A1lBB!!88EE88!!?A*)*FC,,V"_p76711671167#1&'&771&'&5%6711654'&'11&'676767&'&'&'114767113211'"'&5676311#'&763211&'&'&7632"":9HH9:"""":9H 1#^  9*!00GH00 +9       0H9:"""":9HH9:"" 1#./5f    &6####6&   ^  & 9  Ran{!!!1!1&'&'167672711654'&#11&'6767674'&'&'11476711211''6767''47632&'&7632@@@ 2$)*??*)%2    *('@   !//!  Q  " 1##Gf1111676767&'&'&'1&'&'513116751676711'151&'11&'&'5117116751315E88!!!!88EE88!!!!88E :" ":!!88EE88!!!!88EE88!!k  ..m { / /0!K%5&'&'5117116765513''7151&'&'1&'51#1167675147632 /0 "4 V###3 // V /0  FFF/  /FG H:$/.EF/  /  4F&511&5&'&'&'&'01&'&'&#&#!113!1276514'#151#151673113  `|  ` ` &/@IR[#3#13151#1#3#5131%5311#113151##3#51313#31#113151#173#31#15'3#31#153#31#15RRRR3)RRRRRRR3{44444444L]])]]))]]u33L9Pi11"'51632"136767&'!1&'&'16767!1671167&'&'"#11715134'11&'"#1715136765  5      `   -4  4   D CD  `  `  !" 3! 3"9KR 7&#""1117&'&'&'1101674'&'676767671#151"'&'6367715&'11�1&'&'&"13"'&'&'517165&'"#&'"#1276767327676763676551&'&'&'01&'25276767&'&'&'571'''71''27676745&555 '  f-  19 ;##8  !  5       !"    % %! N G -  ^"  -##                 %$/".===3 "H[&'11&'0101276745&'&'01#1"'&10111&''1&7671167671111&'&76767#7111#1&'11&''1'1&'&5&'51&767110*##65SR88##*  +-P*  ~; &T(11CS8866RC11(  ,2%( "j= $+%.*X471167261&#11&'&'&'&'&'&7&'&5'0167676763216'67654'&'"&6'11&'&'&'&'&'11"'1767674'&''''#"'&5&7'12767767676767672., d,&  ,,,  ,-  --d ,T,,,'   ,,  %d +-  d,& u,,, -14 -,d  , 5---'  -/4  $ @v!/8U[765&'&#113127674''3#36##15#3#51316#%#3#51314'11&'27#1#&'3165'67#0 !/2$%AIII OSSSSU6g8 =;$###=\>>54s546Ee  Sb5 ##:('&&;=$%W @55 9BUx77&#113'#3#13127&'&#3#3&'7!!!1!167671&'&'#3#5131##151312711000#1276731#&'&'6767.-(((+ ???i@@"NNNN#][v!d" "2! 4- K@; '  ' " /! 8Rex%1111&'&'132765712767&'&'11&'16767''7676'&'&1'7"'11&'67632#5671167&'&'!!88EWA@_T)'(; EDeE88!!        E88!!12O'<)((V 7b@@!!88E        Ubo711''17676'&'&%&'11&'!111671516767#1&'&''11!16767767&'&3476'&5 u8%%&OY@    0 Q%%&8%a@d!!!!  3Pi1111676767&'&'&'"'&'&"#&56767"'11&#&'&"#&'47676327"'&'&"##&'67632E88!!!!88EE88!!!!88Ee/556 >=<6  0?@?dM 9POA5A765+ !!88EE88!!!!88EE88!!  B - L  @,71311#1111#15171'1#151317171676131@bbb[ ,]]V+bc T]  T]5K"3DUfw7'1#"5'171477"116771'1"1132771'1&#"1132771'11132771'1&'7"1132571'14#7"1132571'14#7&'111132571'14'&#"11411327655171'1&'"1132771'1&#&'&'"1316767&'&'%116571'1&''116771'1&'"116771'1&#oox'&7""6AAAEEA-iEEiDD`####9899 DBBDFDDFo @ /:DD>7#$ "!<AACCCC5%5#'&'&'&'3167&'&54767'"'67&#"7&& !"K&+!&18 %%6444;++ $$MNuFF-,?&'12 !!+*.2< "+2;DMT''&11177165514'''1'15#51'17'15''7117''711557117''71 ବM_,_M7777M_NNNNNN_M7777   asss3?gggg?3s%%%%Jsss3?g444444ggg?3s%%%%J@0]%&54'&'&'&'&&'&'&323232767676'&''"##"'"#"'&7676'&76327676'11&'&'&'&'&767676'&'&'6767676'&'&'&76()120).'' %#" ""\\( ",<='('(C ""&(244%$ + X  "# &   3 3)0!!$#'%!!#< (( ''? **&P   # -  p&'11&'11&7676741272767016'&'&'&'«014'&'711016767011017676501676'&'&#&32G78 7.   ,,  & ($$BCl8"#99F<44$$$232  32  %% $&'"#.-YoDD '9Ma~31&'1&'777&'47'167'171&'&'1&'151"'7'67'16351167''1#16767'171111&'&'&'676767#&'11&'11&'676767'711167&'67167'167&'71&'1&'71&#"1'11171167' ;00 (>  >( 00;x(>;00 6(>;00 ]!!88EE88!!!!88EE88!!  55BB55  55BB55 '  3 @@ 3  4 @@ 4  0  .  1::1 p .  /9- 0  . /  E88!!!!88EE88!!!!88EB55  55BB55  55Bk  /;:1, ,CC, ,CC9Bp7 "'7674'&'01711654'7!!!1!167671&'&'"'632#3#311#'1032&747&7470311&'676'1#151632'516'01&#&'7131137'751454#"#51673170301311#110117y@@^111 *EB y I  5j,  $&p  v@   -   &lKi  *B(= ,?Pmv#3#&"13676'&'&'7176767&'711'11&'67'&'11&7116755636765514'&'&'7131131'&'632"'&551416#&516767317311#1107OOO! 7mC  %? % 3      T?$$$$%$ &9= "(.   H' &   d w! $##$#j$! )a  -!11!1110101015#151'13167676731@P%  #Q@@6eeeg8   7gG11'&767&767'111176'&76767'&76767&'&'H 6  2x@++   #$3:'&&')8..//G0bPP7"5IHY%%877 /.-'':.!"   )(4G//L%"'11&'11&51101'&''&'&767&'&5#"5&7676767&767#  $$$$   '&VU''     4 Z=>==[ 4 3)8Sbq2&'&'17127&56767'"'&'6763"'11&54763&'11&'67631'16767'"'11&547633"'11&54763 76IS77LD ..Gh    00CH....H6k<&&..GQ3;"B+,5 0 <'(('<<((0!%g"1167654'"116767&'&#751&'&'!11&'&'&76745454537676'676'&11'11"#"&'&"#'&'51476!16   P!  !O 0('"'&/ =,&Z %#H*+ $  $ *+G$$  / -#3#13'#3#13'713117131717#1151#11!&&&&j''''aaataM'MMMMDW5Ynnn[[[[[III@@&:M`7'1'&'&767676771&'&17'7676'&''1&7&'&1771676'%1767514'&+dddk  ,$+   J;;; " i ! > k  h  :6111 ,)  o R n^^^' " ( [    (U71111##1&5167272"#&7&'"#"73167410767676237676'&'oK ;+=, $$3  "#%&  @  6&&   t &&./4 g#"  ?= *;&'&'6'45#3#31&'&'1131&'&'#7&'#16765&'7  0]]] >h !05''r &&9m YI AYI30(%%#%'I Ri401,XQ]^dh]]ND  FL.445of@+BKt%11#1676707677!1&'&'16767!177#11'1'1&#1113377#11374'&'472171&'"#"''116767''#1&131476731013!j     Y???+'@$+^(("      <*4% `  `  jH 2 !  #2  @!Vt&8Jat %&'67%67&'731&#67&'011120#0011"15015"101&14141430141030303012010031101410501"1#11315111131'!1&'&'16767!11127&747&'65114'&'&&#"51#113145&3231&5&363157#3#1&#271315 "'63271&32#"'1767''#"'513151#151#11#113113773#3&7'1'&'7&51#11315147674711671&7'1'&57#3#1&713153 "51#11315147677#3#1&713157531513151#113450'01"50#01"10##101033230303052141417#3#1'1#1111511317113157&'11&'36767    v k  jK     (';)#76#);'(5555   -(    $   ;    B  "(  (':*#$ %#*:'(&        Y`  `  :('0CD/'';l,@@--@@,M%%      % %%4K|}P;''*+**'(: @ $<S`s%4##1131257!!!1!167671&'&'23116111#1'1#11#'3#31#11311#11311#''71311#1''211#"'&547635&71'&'67627116'&76761&'713#3#513123#3#513!1676767%&##113127654'      ,8----E$#'  1a     f  Do`YX>?*     ` #!!RR7777TT     B   R  R"! `6 @7fm711!1676751#1'11#151#17131151311713151&'&'!1%77131'171#11'1#11151#1513151#1513151#1137'51'7713151#11'1#11'1#113171311315113'771#  > BRNbK   +++*3DD3*)3CCSQQSza''''%%%%'< =@3>+ B R%"'  ##@@00  ....HH//IG! !H***S)\ddddYYdd=.... @(B]{7"'672'#3#"13176'&!#3#"1317&'&7!1&'&'16767!14'11&##11331677162367#3#01&6733167714'77454'#1"1'1&'#1"316774'11&##11331277162367#3#01&67"33167714'74'#1113316771167&#i      @ ( -U    (@@@  ( -U   /Z0 `  `  f-    @b\\\'&  kf-    @!he4 @+Le{%&31&167&'7!!!1!167671&'&''5127&'&'&'6721&#&7#3#13271#"'&'517113&11"1#1513116761#3#51357517&'1151311672#7#3#7271#"'&'67632$u        j/  .  E  #J$ ,$$$$$$$$J#FFF 5   ` ' "  '"  82 r!U} }}) !3  1QQ7''"'&56762767&'&'&'&763671&&'&'&'&'&'&'"676501#* "#J7!! '$(*; [*F <, NA!"~1Q333*63 +,1$M0; ! @&&'&F r&'11&'!11!16767&'11&501&'&#&367671&'6737&'&'01&#&#&7676361&"3#&'&'@     NR1  % ,9%"/`@ "   UY)   % 0  )P^#3#&'&'#1316767674'3167&'11&'&'!167&'!1&56767!1!1%3#3#1&'67hCCC<=NE88!!5C<=NE88!!5`98U9..98U9..* D)*!!88ED)*!!88E`U89/U89/,@Tm%6711671167&'&'&'&'&'&'&'67676'&''671167'17'47116111&#&4#&'&'&'1111&'&'&54767#"'&'&767"'&'&'676'232367414'&'67676767&'"#'&'&'&7636'112&'&'[      5--JY32 ##  "! "    ,A-"!             b  !" '' -,"89-,98X! k  ^< -e  1*!       %% ~  /'#177!1&'&'16767!1#11317113+++V+   ` A____[p[)G`  `  **[[2SZe| &-7K%''65&''165&'"#1&#"#1&#1021112731327313674'71674'7167&'''315#3#&50171570'"''1650145712715''650501715771'1'171'#17'''7117711#1'111'17'7'1713#67311'1377631157711'15'157711#15&''151311#3&'#171311#77'131777317#3#71177'171101'333 8jj86  7 4jk4 7  s,,,,,,,-333843...,,,,,F#@b  SSSPSPOOOD|q:bSu qqq9{K3ht36<<<]EE#rQQ""RRs<0/!.'56 hLL##A@V>23$EF^#RQrsSS"&-!11<86#NMi VBB#9/I'#1&&#"167267"'&'"&###116766'&#&&"167632632 8//8!-/=*(;%!48<++<84 %*>G9119G>*+"""14;,,;41"#&8//8&#Q +*))]""-''  z$4DTd%65&'&'&'!16767&'&'#1&'5167313#1&'5167313#1&'5167313#1&'516731/0G;,-$!"#4~4#"*  YZ  W  G0/##9# $4####4+!!  oo      ' ")07>ELSZahov} ")07>ELW^7'71''71'7'71''71'''71''71''71'7'71'#3#13'#3#13'#3#137#3#137#3#137#3#13'#3#137#3#13#3#137#3#13#3#351#113671167&'&''671161#1&'&#"36''7111327674'&#'&5'#3#133#351#%#3#131717'11!1!!!51!1#3#13#3#137#3#133#351#53#351#'#3#133#351#3#351#'#3#137#3#133#351#113'#3#13d#|FX!!!!/""""/""""!!!!_""""/""""_!!!!"""" F""""F" ''''0       y V 5zz u!!!! !!!! !!!!0""""S !$""""&    - * 0   & P " "''''o     U""+!Qjjbb}VVVV+;;! ! ! !W B!" " !4G#3#"1#1514'&##11!1671&'&'11&'67673&'11&54767jjj  j (( L|h%11&'&'&'&'2767676701&'&'6767676'&'#&'6767&'&'&'67676363!!2>**$#*)<79!!!   )(*@,,*+BI10'!$$01.  !2  ='&/ w3 &%10%% )*    ('AB))))4, "!"" 2    &%= /T"11367654'&'&'6767"'&56767&'&376767673676765&'&#P<=''=4!  "      5""54I0/T5  >%&5#$ !))*+#*- --/L,,5|&'1713116767674'&'&''1171'1&'676727&'11&'&'&'&'&7676'&'&'&'&"1"#&03767676'&'&#}B[>22v19>23 3+F54NL6755Ne  ' _@22><3s22>-(( D-5N4566LN54        .5#3#1#1'1#11#11311#11311713151#1713151#17''31@@@Q^Q@00E RgYYgRD006p0 00 0p@@@@ v':116767&'&'11676711&'&'1167654'&'M3333ML3333L ''&&  v34MM4334MM43 00II0000II00,+AA+,,+AA+,!11!77#11'1'1#111315@NNN!. -#M@@[ [^\F +@M  1DU%6&'6&'4#"&4527676'&'&'"""'ʤ512767676'&'&'&'&'&'&636'&54'&'&2""&&#31&&#&&&277367674''656&'116'&'6711#&'2301&711676&'6767&'"'&717143677211&'&'676311'&'232'11#"'&'&71123#11"'&747632311'67'&'&7671125772377637767201&'&'6'11#&'&'476'&71167676'&70367&''15111677677&'673111"'&'67676&'11&11611767676'�&'&'117676'&%"11767&'&'&117674'&'=       6BB;($    !   J     Z    0    t 6  I   j$    #''2/&&!      *882R5<=7 5;9/ j   F8                  $+    !!     !       !     ! !! 6  3      $#  B- @! ! -  {$$;      C   * %H%11#"'&547632'"11327654'&#"'11&'11&'7667676'&#     $WV22' JIy&&#%*%G"#~  .   * "#)&:%$6FXo116767&'&'6711671#1&'51&'&1#1&'5#1&'516731'5##1"55147311##1"'51&5476321111676767&'&'&'"'11&'11&54767632#Z<<<{  #`  `  p%1 $&''Z @*D\116767&'&'&'11&'6767355!!!1!167671&'&'#3#&'&'676731K2112KJ2222J(  P      [[[Q7777Q[Q:;.-5p12KJ2222JK21 $$ $$ H   ` `66PX4554X5++A^q77&'&#"271'&'676237&'&#"27101'&'6762'1111276767&'&'&'&'11&'6767!!! ! .!!! !  .H88 !"88DB88"# 88GV:988ZW99;Qd%1111'&'011'&'&7676771&'&'&'&767667656'671167&'&'31132767&'&#"L .L  ,, $%77%$$%77%$Br L .L         7%%%%77$%%$7 &3t"3276'!!!1!167671&'&'&'&76761111'&'01111'&767676771&'&'&'&7676676501  @@....;   / 0    7i@@')(((()'    / 0     B!!!"1676767514'&##11"'&'&'&767636676762o 32??23  $(      '# ?2332? #&     %#z5#1'1'"#&'&'&'&'4545311676767&'&'&'&'&5131167676#6545232323111&'&5111) $$R #$%#         4"%;z  &%@SSG#$><RQSS  !865#-    !  { !!7K]n.%''1111676767&'&'&'776111'11&7'776111'11&'&7'111111&'516761'&''1&71116111''1&7111673111#1&'7'&'11&767716117111''1&711617'&77167611&'516711111'&''1&711617111''1&71161'7717111''1&71167617#3#&'11673111&&&GZE88!!!!88EE88!!!!88Eb:K@  9(^BC@  mt#&&&mR!!88EE88!!!!88EE88!!Y"*  I *  mttttC 3F76713271&'&'65&'3177#3#'167671671167&'&'!n%L`=>m)"":9Hmq0"" M$44>H::"%%%%G:FFcB$;%-3G::""--"#:%%%%%&5115111&'0''1010145&50105&5050#4'514#45&145&14101&54'0101&'114#4'0501&50'050'4'05"54'&5&141&10'41&101&5&5'14'0'4#050''1"501&'4'&'&'&'&'&'01&'"# "#"1&##1""0111111110101110167710103272301216'&'476767&&'&767&672767670145    41//% /.&   (+*)-CC^E88!!      #&)() "" ?./"9"2:BZ9:!"88E&?1111327"#&'&'&'67676731&#'11&'67654'&'676:V343&%-7,DaB65!!88EaC,7f "#++ "# 55<'./7/+&#"2222%# =((+-*(FH](!--5,* $%*3-S%1111#11#151311&'&'&'6767671''&'&'676771&'&#"6767 &1 9:ME88!!!!88EI87"&===*P@****@J+;..8=2112=<00 ,aE)(!!88EE88!!$%@mb E**?@**>"012==214#%'1'177#3#117%%11773171d%%%`TSY(.YYY}T&`:L9%#3#"1#151&##1"1#1514##1"1#151&"#516323767514#"#"'&#"5165&#"1"#&1#1514##1"1#1514##1"1#151&##1"1315167613151&#%##1"551433123##1"55143312$%%   $$$   &<  p   `$ $`@@@@p%1#"'&'51#1315167311#1&'51#1&'&'&'&'#1#"'&'67632237676762367#&'#1"!1514761Y YY e  %%  7Y5$Y ,< "!#6-B%11##1513121111&'&'&'676767'&'11&'#113151316767F FF !!88EE88!!!!88EE88!!%x2F% J %E88!!!!88EE88!!!!88E%%J%e$AJ7#3#5171#11#1'1#111#151311317131%75171'151131711111'1#'#3#5131!!! &=& !B$ $BKVVVIIV VIIV re?>>>&44&>>&44&> !!$M7&567631'171&#"76'&'&#&76&'71'1113767676'&'*0/GF,,2&8C(#"#"">&#^P@!#=(115' ! 3L&'H'$%  ?/'G# %$#"  (A7'177'171111''&'&'476766#77'11'1111171171'%+++,,,,,+*)99--,-9V22OOO}J]]JS+++V+++++Vf7777fe9987XXXI]]IY&&777'11'1111171171'7751'15]]]VllVb)222222222gggV ll Vƕgg222d22222dE%'''1&'&#&1#1'1&'&'&"1131111101670171717131676'F//F "j5  5j" (*)O((P)*( (1?H%1111"'&'"#"##&'&'&7&76767%3#351#155'&'17'3#351#11 0&=GNW`gp#!1"'&514763!12&'#11'11'1#11!167%5#15135#1513777#15#15135#1513'77#15#1513  j % o==n jIIII 666v@T@@@v6Tccuj j jjK22K%%%%J&&&&,,,,I%%%%J&&&&,,,,%%%%$I111111111#1'1'&'&'&'&'&111132'&'&'&'&'&'&'QRQF "33:0 P $$1# ;&'9888$RG+'33L5F. !/11 '&#-((.s'"#&'&54767637!1&'&'16767!1&'11&'&''16767&236'676761&'&#36767676367227     ` @ C6T   %  + ** E`  `  A''+S;  !  Ri%&''167674'&#3236'&'676765&'&#67676767676763227&'&'&'''"#&'&74767632 59'&%$B    (:('    !  ,-6 -.+C##? (,-5!   TCC %&'  >a111&'716'4'&'&'6767267&767676'1111676767654',!! &&=n 02%%<  R006#/0/0#)m  $!! ()OH+,(y<('H97/9:01 &%5:))  54IH=% %/67-     " #$00'Z}&'11&'!11!16767&7116711672&#67676'1145&'1#127674'67#"'767116767&5676743016767&'@!4&  E& "/0"     `@&-. ! %! $$ 2-"$R.%""##    %&'&#&'&'&'&'&7676767676'&'""4'&'&'&'&#""'&#726767016763217676767676767516'11#&&'&'&'&"'&54'&'&'&767676'216'&'&'&76322354'&7676767671723676763203 "   "**"   !  "     7   ))   7 Q           $      !!!"13!1276514'&#111'01"01#"'&'&'&#'&'&'4'&'&'&'&7676767676'&'&'"'&'&'&7632234767676322363232'&'11&701&767676'&#"#"17056'&'&'&'#&1"'&'"#"013267676327654767676'&'@@               $        $     @    &   &             ,=&#6767&'"'6767676767676'&&'11&567672+H/6X;;;;XX;;: ,22K/) H22K(%2//0 :;;XX;;;;XT= 2CK22 U+*2##'K22.GGi r70111010117"1'11'11'11'1711711711711327'1167'1167'1167'11654'171&'171&'171&'171&#1'1171''111715''11'1517116767&'&' - 3= @DD@ =3 - - 2= @CD@ =2 - ʼG////GG////GۄD@ >3 - - 3= @DEA =3 - - 3= @D uuuuvvennnnnn3/0GG0//0GG0/@R3#31#111#1&'&'51676773#3516765414'&'&'311#167311&'71[, &'CCC+% !-$)>2f 0>t%&8pKb11 3 ,,g*0; u 4711632&511#11#&'&'&'"'&5&'67&'7&'&'&74767672676767676767672632#63%116767&'&#"4767654#"'&5&'16753&'16753&'16753&'1675711&'&'4767676767676774'11&'2766765 0 %%     " "!   ##(  /       2)!0)112M*)4I++#    ! ,/ 1  h''      %% ,@    i)**  2        -34G4<.**&'+d*"5))%I`1111676767&'&'&'"'11&'&547676321&#2767#1513175#151#151315131131E88!!!!88EE88!!!!88EG!!0#!!!Fu 7$##$#!!88EE88!!!!88EE88!!!! !!!+ 6!!j####$##$ %67&'&'1113151!1674''17165&'!\@v>>`@@ L71'11'1'171'11'171'1111111111&'&71676#011151717111717n;;;'al(K\}* BN !.:%%%%( Ah>&1,'!e NF6 7 M"$J,%@%#3#&'6765&'&'767676''&'11&'163#&7&7!;:ON:;%%89<%(#/  nnp= "''1Z5556YC10 :?%=%j654'&#"327654'&'47135517&71167114'11&'2&'&7676767227210167676''7&#"32767674'&'a   CA]+ &#     (  AC  `"&&23''!$ ?f\>##$74&& / %$  *)8 >\f? $!''32&&"[1111676767&'&'&'1111'"'&'&'&'&767676767676'&'"'&'&#&5676767632E88!!!!88EE88!!!!88Es    e  m$2!!88EE88!!!!88EE88!!"!""   E  /#1111676767&'&'&'#3#713E88!!!!88EE88!!!!88E0U!!88EE88!!!!88EE88!!!6A^%1''1&7716'6'&776'&7&'11&76'7&1176'1111&'&'&'6767674'11&'&'&67236'6'&1"1676'&'&&'&'&767&'&676016'&#"41017674'6762765016'#014'&'7676767677-    H  0 !!88EE88!!!!88EE88!!B   $                     ,tE88!!!!88EE88!!!!88E+             #$ m%1111&#&5167676567454'4'&'&'51237670#1&'&'&'#1"16727676731#1&'&'&'2'"'13312767673WVVn  (@@DD6  W2-Y)d &<<>=)    ( '+ '@Sz7#3#5131777311#1511#1'11#15131553121##752765516'&'"#"#155311676321'"'&'1#765514'&#"13271111001!101&&'167!100111!16714'&'!Z$$$$B / .D  +#:" -8  || ||IAAA]][[ #I0rYYY5 r,&   #  $   |  l%4'11&'&'&'&'&'&'&'&'"#41"1"#"##0122333123636767676767676767676745070151&5'"'11&#"1#1513116         II 3         % ^ &Fy!!!1!167671&'&'11''&7716'&7676'&'&0'"'&76'&71111'&'&23'&'&'&7676716a(())2''&        %        % ''&  ((((%     ('%      '(%%   0111676767676'&'711'&'&7676>??>F/.W>?>?F/.WP+,==&',+=='&  11G*&'W  11G*&'W=&&*+==&&+*=9BYbk%1111&'&'&'676767#&'11&'11&'676767%'1'17'#1'11#171'17111'''1'17'1'17""::GG::""""::GG::"" 32?>3223>>32WWW%W%n///213D EEEDP7777G::""""::GG::""""::G>3223>>3223>%%%W%W^^^ddk uDE+77 #,5>GP}7'&7676'&6'&7&76'%6'&76'&776'&7&76''76'&11''#'&'&'&'&767&7676766 &'11&'&767676'&'&#"1"1'&'&'&'01&'&'&776767676767676767636576'&c     V   z        u   '  P      !!"!)10-5((F                "   H         :    8   J    "$$# %##37 K     %%       \  3V"1113!1276514'&#!671167!11!1&'&'3111#11#1515151&567@ @ @@    @ @: EE   ATm%7'&5711'16'&'&'"'16771'11'&'&77161712'671167&'&'&'11&'11&7'17'1#  ))(-''"/L+3D"!"!  :j A)( ))9:4'z&?+'!'&( V. = B $$"'(7C))'(1b%55'103670167676701010145&5477167676731176767676'&'&'&'&'&'&'&#"#"##0#&&'11&'"'&''1&'&'""2176767676'B3 !!+2&' ] (( !",/%$  9"##$,-<;-.  B ! +1&&  "x  $%00%$  ++9;//  J  Tu!!!"13!1276514'&#&11'0#&'&767676'&'&'&'&'&'&7676767676'11'11&#!1"'&54762323236"'&'&'&7676765101&76232361#11&'&7676"#11"'11&'6767676#;;    >? ../ % u  *,+ (4  z    )   0   T#  D31 G#23 #+711'&767676%11'&'36767674'()* '()* '_:KJ:% +*6&56>L=>$$70/76//79^)(21#"-%$>>M Y1111276''1&'&'&'6767311'1&'&'&'&767176'&'&'&2717651&'#G99#""!::HB9 '-X:::;Wv6$+'&%8?,+)(=2& !"99FH::##<;YV::h'$,&8%%((?=** FW"11767672167671232323236'16'&'&'&745&7676767/01(  *),) -22)( 6%+*  /.d2 /& !!"  "&  ##  )=%%    1N$-4;%7117111171117111'171171777711''1171'&767672717167171111711117117171171171711111'111'7&7677177612767777''17'''1117171171711717114167676371716'1711717111171'111'11171'11'11%67676'&7676717171711&'&#77'1###"@ /  ]    ' A$$%%7 K :(~,   8 ( 9 & ' +"% (&9m  "?  qsvPSxx$$$&  uoV\F  G<<<!-&&&(Kzfh?B)    +.O,-+#'%'  *(?BR#     &' ,Hex776131#1&'673171'1&767'&771673#3#11'&'&'&7671111676767&'&'&'11&'&'6767 W?4B O 555   $ZE88!!!!88EE88!!!!88E==\[>===\[>=G  s$ """ >" ." ? !!88EE88!!!!88EE88!![>===\[>===\#Ea!!!1!167671&'&''&77167#3#&'673171'1&7617161313#3#1'&'&'&76731`  `   3A  V>b    4   `  "6r#   " &%!7 W&/Pc721111516#&#147661#171#1'7&'6&773#313167632''#11#154'11&&3276573#311167632''#11#154'11&&327657476321#1017'311''&77456&1373#313162#145016"1#15*&&.'++N&&&  'Q  :&&&  'Q  5 ! L& $' L&7'''# '   L'%0  _     F==     F=$   ) .   Dw@@N%654'&'&67676'11&'&76767131717131'167131'167''1'711:+,Rcml[O\8984sH2+ /!d=*D"e"#!-fI!#"fO=72$$ 3*ABP))." =+(63"%5 GnQ)))5|  -F%51%1511%77&'&#"316766371&'&#'6711611171&'&'67@@///--67,-GQR9 5!.="yCMNHH31)ABOOAA*6666H+*8 G. /4  E>%$$$?J!!!1!1676716'&'7'111'1'171167'1'17171116760118989: s)4:E g  _4n @ =0dq  w9N7111#01'&'#'&5&766516'&0#&'0#&567676766711676'45&#&7"''1&5&70103231714763316171476331604#1"'&501'1101'#"'11&'&'5163676743676'&'&'&'"'&'476721#&'&'&01'"111#'&'&766767&1111"1&76761676'  & % ' V    2 $!!%  !!    !    )6EECXRQB~s   !$$      "   E     $$S       i'<S0!  ##  ?Y!!!"13!1276514'&#11#1"'&'#11#15131131676312'5##1'&551476312  @C @@C@. .   & #K %#  o%1111&'&'&'676767'6'11&'71'11&'71'11&'11'1123130#"'1'"'&'11117111717676'&'67'11&'11G37'11&'11&'713!!88EE88!!!!88EE88!!   %     #   # > E88!!!!88EE88!!!!88E# -+,-  3H -,-- #W< X6 +>Lq6711611'&#"'&77116'&'&76'&767116'&7'55&'1671111#"'&747&#1776751&'"N1==>=2 BTTA cU)) ,+A].. ((P>  G @? $#--#$},/ >: ] JIV@==..!QQ`SFG OHHH H   A<G44G s 0@P`p11#171317#3#131676'6'&'#3#13167654'&'3#3#13167654'&'7#3#131676'6'&'#3#131676'4'&'#3#13167654'&')GD ~DDDF' DDDF) DDDG' DDDF' DDDF) DDDF* KY (Y Y Y 6Y Y 6Y 3l763116323"#"'&'&7&1122371716'01&'&##"#"#"'"'&'&'&'&5&545454747672723233'&'&'"'"'&74'&'&#"'"336367676565&5>'  0   ', $$PM$$   (22AA22 U     *   _ ,   $$QP$$ '  $$RV)(- $.4Mi%&'&#&'&'&7&'&'&'"'"2327676765654'%67116323##"'&'&771'&'&'&76763016 (%  2C " 0011 /#  #    + M2  ?@  2) I;I &$% #"!!@   #,5>GPYbkt}53151##3#5131753151##3#5131753151##3#513153151##3#5131753151##3#5131753151##3#513153151##3#5131753151##3#5131753151#xpppp(xpppp(xppppHxpppp(xpppp(xppppHxpppp(xpppp(xppxxppxxpp(xppxxppxxpp(xppxxppx-@%11'&'&7676&'11&'11&767676'76'11&'11&'767IVJ78 %%8SPP56##<>HA22%>>[J;;!! #17$%'%   LT  >3223>>3223>D----DD----D& %&7 +  Xp  23>>3223>>32--DD----DD--+%51#1'1517131271167654'&'&&389%  %%  %9998 $$  $$ o5r711732767676'&'&'&'&"11#1"'51#1"1311'&'&7&'&'&'&7676&'&'676676'1'&''#3#&'5167311'&'5167311#75567311#1&'5#1&'516731'(<(56'4#" 8!"%%+ / 16$% )* %%$   ((((v    p    4!&+0,,, + ( "      $$ !!" "& (h(((    ]     &Bt7&'11&##1131677131##1131676'3#32771#1"31714##1&5477#3#131111#1&543316771#13167716'&'%#3#"12767716'111#113127713113127716'&'&771633121##113127716'&##1131677% #     (%  NNN: # 09 L$ 0   b! 5 / C    `   )# 4 " c#b@ (!J   (   71711!71113111'1'131117171'11111'17171#1'13####9so bc156p{tt44P///2J&=.//*%11#&'&'6767267&'&#2767&'X,,C"//7E88!!!!88E7//"C,,O'&!!88EE88!!&'N*<a&76767676&'&'&''&76'&'&"201"01&'&7&'&"7676727#10#0#767476725010'012410767672323#00#05716760767676510#0'&'11&'11&'010#"'&7676767&4747656'670101&7767676'7&'"'67676'&'&'"'#&'&'&'&'&#"#"'&'45&'&#"#&'01232&7677676767'6017676'&'%&'6&7&5&5&'&5&76741671&'&'&5&76767056'&'&#"#676'&2767633763'67'1676'&'&67&'&'"'67&247676'&'&01"#67676'7&'S " 9       ( , %    $% %))          !   z               #  ] )  :#    $ {  . + )" !$1 $  &/         %!                        +DWq3#31#151'&'47676511327654'&''3#31#151'&'47676511327654'&'%2111#!1"'&514763!5!!!1!167671&'&'~4444) @   3333* A   D  84 h  4 h    )eo7727676'4'&'&'31#"#7271167#113'5#11#1&'&'&7&#1'&'&7514763310363274'31'6'&  O& w+J!   [R T6 @@@  @&&&  % ੩7     + ! 8 8C3#351#'5315%&'11&'&31676761111167676'55#11311WJJJJ>>)*8VJJ..`//7 ''4S>?__"J=====8)*?>S4'' 6//`..JJV____sH[n&1&'"&&'&#02767054#&'&543676332720"3367456'&'11&547673&'11&'6767 :>CC>:8CP IKLH ODfz   UTSR1 !! 1"711110131676767&'&'&'"'171&56767>33>2222>Q$%66%$$%622="",,!!33=>23 K"6%$$%66%$##3#515##1131251&##11312551#^r__` dQT~ #,T]fox%#3#51315#3#1315#3#1315'#3#13153#3#1315&'11&&''11!1327677676747'%#3#13153#3#13153#3#1315'#3#1315^BBBBBBBBNBBBBBBBBNBBBB $ #M 8nwTT) BBBBNBBBBNBBBBNBBBB;;==;;H<<<CLi%''1#167676'&'&'&'&67654'&'67676!17'&'67671167676'&'2[ $$4,   8*+P"////3,+* "   2RRRA())0)) " ?.-@m012! !!## ,?JYs11767&'&'7116767&'&&'11&'7'11'6767&'67&'&'611&'7!!!1!167671&'&'"'11&'&54767632#$#2$ !U) $%!15)("&H0 ! "#%v@@+%%%%++%%%%+;     &6& !;&w1$ @%&**&%%&**&%"5315131#1131676765&'&'#@kV//-,\Q67=Erwww7/0><01@ !239[?E#,5!671162&'"561171165&'&"67&'#67&''11&'01323721&5676676632'"11''1#"''&571"#&5473&''&7676767&5&'7676363676367&7676676222'%4'11&&767676'&'11&'&327677&'11э"1&76767676'9      >h00    D0    ,_   5  =#  " 4       j h        _    $    *      :T     3#3#131&'671131&'&'711111!16767131WWWWdL@#$1!!J3&%` QkQtL %% @bU67*0.#2$7531513171#1514763251&'&#&1#113PtWi' BBb"&Y+a$F1176767676767&'&'7''1&1'&77167617716lEF%  NIH//EEkIII  : OI  : OBCj6-.!  ;;XjCBttt  ,< t  ,; -:K#3#1#11#15131513151315#11#1131513151##3#13151315315131513151!@@@ZZZZ@&Z@;Xw73#31#11311#151712'51&#15131516614'&#"13#3#51712551&''1713111'1'11'171'1713171311311r]]]M; &i%E   ! n *+ & &3"# 3c-  "  ("[---  -% &&!#7#3#1316751&'3#3#1316551&'7&'&'&'&'"'&'&#"00111011111100120101000321111312010201010110000111011010101212322123032320321232303212230303232323012323232321212321230363230323212363032303216321230367670121474707014707412547250503474341056701016565070147416141654371470525710741470565674701054165654345054345414705414741456501417105056501054145654501450505505250545454545&'51&'&1&'&'&'5147311315147311315147311315162351&'63216323276321#"'&#"12361315167311315167311315163312v*44),))12))- ((    4444}   ?Q'  )Q? L L GZ 1%F671167116'&'&'&7'&'11&67'&'&'&7667&'67674'0   0)   -6\====\[==`    1j  =<\\<==<\:0 H&516716767&'&'&5167&'67676751&'&'&'"#11&'&'67676'&511&'&'476'&51716767674'&'67&'676 @Ac Q43""9  3'&>  >&'3  9""34Q cA@ $%>?M M?>%$J  ,1hHH|h@@XE88  32?G77\  %  &&  &&  %  \76G@23  88FW@@h{HHg2,  06N@?''''?@N60/)9%#3#1#&'&'6767271&'2767&'&''#3#13151&'&#D &48&%%&86(>A[>2221?0+,$ ( jjjv4%##&&99&&'?A23>>32*qY)10w11"'&'&767627!1&'&'16767!1511451145#11"'01&'&'76747010301'&'401#176765,  #Pv' 3- !!%$$% -#gPP/0Z($;+  "  'cCZ73#3230127676'654''1'&'&7676735131501'&'&'&11727676'&'&#+ 3)(3 $FN-. ('<. ,8787 )""*# 6-3 1!"A,-Y$"6 =HH<+, .n !E.)) **,6 !%311#7!171!11'SQQQ6Q0QS%%''1%11''1171654'%%'1E<;;;AA<<ݡ< F """@A#  < @6o747116711671167&'&'6'4'&'&'&'&'&57&'11&'11&'1327676701270367674'q/        $  $%-$# '!    ""' ~,7fsJ_n9LSho1111121677476567'&'&117'&'&7111101&'&767767650765&'1167&'&501711'&'67#3#"327676'&5&5476767276767&'&'0101&#&'&547676'&'ǂ#&747676371'14'&'"&'&76701&&'&7&'&545#1&'&'&#011201""&'"11676767676'&#63"#"&'&'6767&'6763%&'672&'&##&'&54'&'2&'110'&'&'67716727676'&'&'&'&76763011'101&'&'6763201171016767672453&'1110101"#&'&'&'&##1"6767"'676'&'&7114731"'&'&'11&'&76731767677#6'&5&'2767'111676501#"'#3#"367676'&'=       >                        %++&  +       ,       **      u    %.  o,v,Q L%       >      -      - f                       $+  +$        (                          + 2  E   @S771#"'&''1'1327''67676#&'01&36767716701"'&56767"'1676771#'"5676767&'&547676760#'41"5'"7'&70567621276767676727670147676326767610161474767632676760##36707676571'&'711#11"'11&'67672717161114'1#"'413167"21!       &%        0000#"--#" !1 =9 F  9PO }}}        O^          .   1@<)!B&'11&'!11!167670101011#3#51'1310167016767311@UP%  #Q`@g8   7e!!!1!167671&'&'"#11 "'11"#"#&547676507676'&5&'#11"'&#"##""#&7472767676551&'&'&76723322327630#31676'654545&'&'"1&76722232363272313st%   p        n    rk     =f    e> :1111101#16767676767367116531#1676767j )b !*b<*b *b A)(4A()54A()5A)(K^%1&#"327674'7136767&'&'5167&'&'1&'&'&'65&'&'67&'11&'6767 '2  2!.7%%0  ' Z%9-!2  2%$82##>    = s]w116767&'&''&76723670125454#'&'&7676327674'4747636767612#3#131676751&'&'&'11&'6767I0110IH1001HO    ( *,,,,yR7667RQ7667Qp01IH1001HI10   8(%  % B#/  ,,,,d67QR7667RQ76^%'&'&5&767676367016765&56#1'&'&76767276767654'454767636767612~ +  ,+++ !   N/B<)  "!N R/2  )((" {DG`{*9OXbG`m|%&'11&'&'&'&'4767676'4'&'&'&'&!16767656"'"#"676767&'&45&767&'676'""'&76767674'&5676'67676&6'&'&'&'&&'&'&'&'671123&4'&567676&'6'47''61257674'11&76''&'11&732&'672#11101417271167#711#&'&5&'&'05&76#3#4'#1&'67677623476#7"1#167&'&'654'&676767116&&747631127&'&503'&'11&7'&7711767676'&'&'&'&'&56'&'&7'&'11&'"&'&7&611&76767117'&''&'&'&'&'&3723 !01(   i" %    %$             h  .8      5   $S      `      , \     4:;*       ]         +))      }  ! :&     %    I  @     F               / 3Z&#"767676'&'11"'&'&'&'&767676323'&'11&767676'&&767601"'&'&'7&11'&301676767676'&##71716'&'z>D?88$$;;AA:9%$;4016 M( * $@%%*2SSN9 --11    .%9;AA:9%$;;AA:9%2    V "  MHL.$99?7  I!11!11#&'&'7175131&'71674'&''1&'&'676761&1#@"*c:"   (!  @@! @(  #  0\&'11&'!11!16767&'11&'71751311#777674'&''1&'&'676761&1#&'@"*V"""   (!  :`@ !+  #  (!A`7777'&'"'&5676%6#"'&7&'&'01674'7%11&767'1'&56762%11"'1&'&'1671&547672'&'&76767131'167&'&'@<<<.Q.( 1;B4   c-    @ . '-  i   ?2M.(1;B4)<## --<<##('8; J ';;;A  *   08E4    6F,&h 0,;,&18E4  -  ?9h0((0((]BB!!88EE88!!BB]d*/C .1MME>@A+ +$)*',87/1(p((0((0#3#31#1533#31#153#31#1533#31#15,76751676176751676176751!@]   t   *:H1111676767&'&'&'1476327&#"5147632&'5147632E88!!!!88EE88!!!!88EP0  x  x 0  !!88EE88!!!!88EE88!!    :  1%3#3&'&'3151171%5517113165&'&'&'3`lll!78DD87!lhhK !!88EE88!! K@7  7ii0П&*E88!!!!88E*&)K`y%&'37671#"'&'51632'63112&#"&''53276751654'51&'&&'23116367676545"'&'111122301&'&"#&'&01327014'*d,'01@@11',33+3@@2 -11- Y,, ;;JJ;: ,,*8887+33'%J  R))))R :.-FFF01\--.-Z01E..  )7 ) {  T"''1&76767676177165514''1&1117675147311"'&''1&55147716111#74'11&'&'&7&76723312765&'"'&'&##1"67 >  /2 5 0 +)   WR&, 9$ ;Z<%kjj  8  k k  k  A:   >@@ *7P%#3#5131%5!11#151#151!#3#131513113153#3#131513153#3#131513113151311315  @`@ @@@ @@ `` ```` >B9k73#351#35551&'&11311167#1&'&'#111331276551#767#1#"'&'51#151676131514'&'&#"13%217151&'011&''111675151&'&'&'&'51633#351#&'6771'1&'1111675'6321#"'#"'51632''#11311113151#h5 O&%!#01"" !  !!   (%   )&  `  #" $%I/;;;?   %%0#""#0%% %$ -     qD    4  :  ZZZ)^2K^q /B6111147676'476767&4'&'&'2'&'&'#"'&'&74767674'11&#"3276554'11&#"3276554'11&#"67654'11&#"3276554'11&#"3276554'11&#"67654'11&#"3276554'11&#"3276554'11&#"67654'11&#"3276554'11&#"3276554'11&#"67657&511&'&'67X  *#!%8! ,,00,, ! @``@       H      H      H       =SS= B^^B8   * ,>J: :J%!"/0"!%h   B   B     B   B     B   B     B   B   (  %,7B[j{&'11&'11&'676767213155513567#7715131516'7#11'3#351#11#151#11#151#1#3#516'1315571151'151715'#3#1315131&'&7'1676'E88!!!!88EΕ`F)o9  sD)*EEE EEEEEE$$$   8!!88EE88!!p ]]]? 6  480M<=Np0!!0 g E  9G%&'11&6767031167"'&567674766'11'&'&54765'11311!176771317676'&'#1&'&'#1514'&'#1&1#1"#1&  , 8&'  ! A V  " <<)H  ##  5("!<( 2211 U #"&'11&'&67676767676767 .9BA7?5)  7 !&2%$ ;;D'>>21%  ('97T&'676767676767&'&'11&'11&'676711&'&'&7116767&'6rf ) 01I!!!1!167671&'&'5#516731#1"#3#"1#516731a)))) 8 888  ))))888  H 8 1111676767&'&'&'#"#"#"#"#"'&'&'&767676767632370176763232327676767632323676#"#"#"76767632323232E88!!!!88EE88!!!!88E  DE          ; !!88EE88!!!!88EE88!!34   #" .. 1     3Wbs#3#&'&'516767311'&#"#1'1#113151676327#"'&'3165654'&'&'&#"32767''#167632327654'&#"327654'&#"@6$%%$66$%%$6  $  t S " 3 P     %$66$%%$66$% Z"h  %"G   d  BH%67116''1&'&117117167611111%116767674'&'&'''" & ZAB4 $ ] 08GE88!!!!88E&&&% ' 6b944T@ .%)! " %P"!!88EE88!!I;>%8m%"11327654'&##"11327654'"11327674'&'&'&#"&'&7673276767654'"'165676'&'6767   n     )(327$$2))33))2$$732()-,3ABccBAABc       8$ 4BB4 $)..)  8,(8@****@@+*A1111676767&'&'&'#3#'1&76731'11#1716321#"##"1E88!!!!88EE88!!!!88EZZZp KTUZ  e!!88EE88!!!!88EE88!!\cc ww#,5>GPYbkt}''711'7711'7711'''711'7711'''7117711'771177'17177'1717'1717'1'17'''1717711'7711'77711'_777JNa..."7A %  " <& )))#.'UFFF7(T***3)===5P"3CCCBY,"...',)$#$X####TJ " !- & %; / 1@ )*r@ D9996_ l--_W OVB? $_h75117117'711&'&'6767'&'&'&'&'&'&'&''1717167654'&'511'&'67DDD66DT%;&%'&;8  &,$,@**   >t`5 #(6 ,+>>,+ A  1 &*4,,B3'  #71111!167676'731&'&'&'X+AA98x3%&/ 0+11'(`FEPP623A&%3418N"#22@mST22)''67&'&'6717%&'11&'6767//FG////G<-7$$$$76$$$$6+8H/00/HH/0%v$%77%%%%77%$Z7&711676'&'777&'&'&'01'&'17767676'&'&'&'&56766@;CEVV?;C *@?@A0''' )  (  8FUV?<BEVV?2))) '  *(   -_%''1&11711611''1&1107716'7''&'&11177111716''1&11''1&771617716':DT^- +29_\-,ARJ"}*'7\H$5Tg11&'&5476323111&'&''15116716767&'11&#"#"1'&'&'67677&'11&#"67674 1m!:aG 01   &!  !0 O!k'f0  1  !!  @%"3'&'11&'11&'&'&'&567676'"#&'&76'"'&'&'&'&03207676567276'4'&'&'&'&'&5&'&7676767676767633632765672327&'&'&'&'&7676767676747676767676767676301667676545&'&'2 6          N          )                   j'1111111167676722371111171711717171171'171'11'11'11'11'1'11'1171'17171111111'8P  C]8Y8}Rsf|1.+l &  ,ND% '$J .3E6 {l&Jc&Tz8a %   E`)Wl $%11"'236767&'%6711672&#&'1167&'&'&'672131514'&##&'&50175#"'51#116751#3#3513167&'#113175531#3#3513167&'#113175531#3312551#11##1"5514##1131233312551#11##1"5513151#15131131514##11317531513151#1137531511317113151#11'1#DEg&" gEE2.EEg "%gED-2<      y "'  9'  9 & ?'4;1! $$6-!#6$$!!2!-(     J777777VH++H+" >=    @LB!!!"13!1276514'&#'11&'311316751&'#11#16767| | :**^DD^&%66%&""9  | ""9D6""""69**!1'1511117151'171'''117XeWeUUUYVX@-uKK:5:O1117/5(/6=DKRYcjqx67#1'55#113145#3#31&''#3#31&''#3#135#3#135#3#13#3#13#3#135#3#13#3#133#367#173#351#3#351#53#351#553153#367!13#351#3#351#!!!67!173#36767#1731014551#53#351#Ee  s  %  R xFo11111111'&'&'&771677167676767456703655143610"'11"27676'&'45&'"'"'076'&303''&'&'&'&'&'&'&1767676'   1      > !!  1    ; 5P%11#"'&'&'6767632!11327676'6'&'&#""'&5516'2713221##1&'&###654'&54771'17117113311654''1&547416167133351&'71131'1&'71131'1&'71133276765514'271#'&511123'7&'&547#&'&547&'&547 99?@89  99?@98 734::4334::43  Q        WB77! "77AA77" "77A<2332<<2332**   $$5  0,('H&%  *&,/#"39&%    !    8e"..((4   8`=>.   !%&T/  65QQ!+ !%=! %$Bb 9        @!!!"13!1276514'&##"'&'&'&#"'167676767676'&6f f @B.  %  C2  f /RV45 8a. N@`3g7&'11&7'1&'&7311067610171676731011#!&'11&71101'1&'&73110676#716767311#'1111011#1&'&''10'&'1011#1&767017147673i 8! $ $ !8 # 8! $ % !7 # 8! % % 8 $` p KK p  p KK p  p KK p m711711116767&'&#'11&'&'&'&10141&'&'67670563230101601767676212217&'11&'!11!16767771&56767"'\ 2$8&&''68%%    @TTT--CA/.-.C)#& 0 %%87&'%&8K      @R%+C-,..BC-,`s55'1'171'11'171'11'1'1#111'1111'1111111111711117111317171171'171171'1717"'11&'67632#'11111'1111'111#1'1'11'171'11'171'1'1517171'171171'17117171311'1'1111111111127673371713111717171'1'        wH///7'6'' * $%7&66'5%$ *  $-&           -( #&4(66'2#&)'$4'4. '-$ %0t1111676767&'&'&'471&'&'"'711#6765&'"#"'11'1676'4'"#"#6767&1"#1'776'4'E88!!!!88EE88!!!!88Ek9""!CD#'    "0R  10;Y> PQDDD3!!88EE88!!!!88EE88!!1*55C » G_.9 ))J/! 0;>32"Gj%11'&'&'&547676763'&'11&'11&'&'&7676767&'11&'"767676767654'%211113276762&'&7r!;3*    27 "$$ , 1>=>!)   !  %%. !!! & 33>?<#")881!     '77#171&'&56763311#151##3#&7315WWW@`"+*?R7..#%""9P)( ?=.55131113111#o7R^4y3@*<C=P[~#4767"11&'&'3676736767676501&'&'676703&'531513167654'&'#3#3#156731131514'&#"316721137&'67711#7116771#11#1'1#111'"'123u            d*I###))#&5 " f 5#$3!      %B&%Ma  &  J ss @ /8k%#15131675117!1&'&'16767!127650111&'11&'476721&'&#"&'&'6763236765017&'11&##113151312767&'"3167211671113157#3#1#1'1#111'"#12377.0     @  <       3 Z& %  f$ %7?  `  `  v  K 6 /  DQQc"hfCQd71100&'&7676741672&'&#33125276767676'&'&'11&'&7676771167676'&' !  &)$)#"!! #$! B     i$""5)++&'%%()#(44-,/.!(55.$%%/.,Ly Ph"''1&3676177125514''1&111551433121#''1&'5167716111#74'&'&5&763312165&#3#"54##1"3277&'67#&'67#3#&54##11#151316#01201'4#11312'%4''1&##1"11771655147716321117655%51''1&55147716175161&1'1"#1"131771055365514''1&1117716''1&551477161177"131217125514#'10#554''1&1117716745'11131#''13<::9 :::/ 7    >=$%P===%-===%>$M    ==>=KM !B!!B  BB B!!B!B  2      $$_,  ,_h$$G$ ^   $$G##  ,GGG##G##|4g76711676'&'&7676'&'&'&'&'&'&'457117676'&7676767676'&'&'&<NxN())))Tj 2   QQ/9 / 84L8g%4711656#113161'1#1131'4'&5&76751&'&7&'11&'43271&'""'136765&'&''51#1&173151#1745654'51654'45&31167'1'017&'11&'43271&'""'136765&'&''11327'1#'3105674'&'63#e**j$     K*)  $      "!_!9 0 "" 0        ;0  0 "" ";      E'' $ !B?Xq%77"&'&'4'&767616'&'"&'&5&767654'&'110501111&7676765016'&"654'0#&14#&'&'&54767676'&'&01727676'&'&#767674'05016767677676761"67671076111676767101017676765&'45676765012767674'6767676'&'11'&76767676761630771111#&'&767676'47012767670017&767.      :K44 $#3 *0 89E)'($              ')  ,S  o V  EW           #*)++ "      $         .!\  5  #3#1'1#111#3#3171311eMMM80[555sr6YY !73#3'1771171#3#'1#11#1LLL&&& N111n0[[JJJbbBB$ X("+<aHU7''#11#1711#'731'''3117131755311#75#151#151311##"'&'&'&5476767276323#4'&'&'&#"3276767675571165657114101&''131131'113171311""01'11'11167&'51113274'5111#1131513113151#151111#1131513113151#1512767711#1131513113151#15171127&'5171167&''771#1'11#k4>>-'q>>>-->Q)d)          _YAA >? @@Y   P   &&   P   ****c++++g``ttttt 3       a  ))               X++++((~t8I`u% "1101#&54701454'&##1456'&#'&5276765&'&001676'4'&676'&'&101"&56567656'&011'167674'"01'1676'&#&1"""'&10127676'&&"#'&1376771767676013137676767013176767677676101765"767713176701076567116"101%471167116676701#11&'05476201270511476012#01                   +       T        %%!       #    #      :  |     p#7#3#1317#3#1313#3#1313#3#1315B2222e3333e3333d2222}CLL M)%,Yj7'&'517'%671165&#"3#351#3#351&'11&&3012767676'45456'&'11#"'&55166'&'11&&&'01511&&13151&'&'5115147671514'&'5132767676'45456'&'%5&'&7611#"'&55166&&&98'-  ::::J::::    'k9-) *: "       "*`  s  xnn1     H)    *  'J 1 ^ 6    1???()  x 31711317'1#117Y>>Y,,,-Dqo$ttXXXX <D.5Zw716751#"'513151#''#11315163651&77174251&#"#&'17767&'&'&'4'11&'36751#'&'3165'6711632''1#1171712767&'&#&''16323#351#+++   ""Y&,  \,,,,S !  VX  ',   ,,,,/  "?& g ) H % D  *   (    "#"( !  A 3 *'{B  ! u26251&#&'&'132767&'&'&'&'&'/!&%"GGX44 !$*)%KQZ76"!!%! **L/   &'M4 "94711676767'01&'&'&'7&11676765&'&622 )(& ! {  ()7r (8877%%'&=32>>%.#..##*)+ q0l%j76767676"##1"#&'&'&'&'4'7"5414'&##1&102367454151767656'&'&#&#"#01&762'&'&5454545457"111""#76367600#01&'&767433232745514'&'&'"#&#"#'&'&76762&'&'&32367276767676765655'&'&'&'&#"#"#&#"#&376767656#"#"#"101&5 =B /0TO /5%&)'QA  "  /       #       $#"{ !  :  I* *  j     {65HI  YZd@5O%\745114551436'&'&576725454545454#&#&'&%!1&'&'16767!1#&#"#&37676767674#"#"#"014501&'&'&'&#"#"767433232545514'&'&'"#&##10#0#76367621010#&'&'532327450151203767656'&'"'"##10#"41014'45&##1&&'&'&'&'&'&1323212131030367676701676'7&'&'&323716201367436767670145}  (                   BG((83 6D # ,' 2  $     `  `  &'?> T f  Y  c<  0    8%7'11''1718]]]]z\\\\(7!!!1!167671&'&'3#3171311#15''1#151311#GG```>oQBBB`XvGWttrrrr%.7@71111676767&'&'&'75#151333#31#155#15133#31#15""9:GH9:"""":9HG:9""++*G:9""""9:GG99""""99Gj++U++++U++ U%''177!!!1!167671&'&'11"#"#&'&'&'&'&50147676767672323____f@@!""!!""!666l6@!11!#3#1#11#11!1@fYYYZY @@ZY Yw=t4##1"133125'&#"514#1"13312551"1&7670113125514'&''1&76767514#&#"011#&'&13270327676'%&1111131255136767&'&'"'&56767'"11327654'&#))_$))"" : '  5!%)!//   " Q  {#n  -  "  )Y/.  h9La21111&'&'&'6767635"11113276767&'&'&#11'11"#712363#371232767676'&##173#31232#167676'&"#1#1711'11"#712363#371232767676'&##1@WDD(''(DDWWDD(''(DDWYHI*++*IHYYHI*++*IHYf y%%%  G!%%%  %%! y%%%  G!W"#((#""#((#"&&//&&&&//&&Gl,,& `jGl, 13J#3#&'&'&547676765&'&'&'27&'&'117"11767654'&#:+$%%$+I-- !77DE77!  !77E##N )%&)*&%33H-4E77!  !77ED77!   )@/?O_o#3#"&'&##1"133127676331276751&'&###1"551433125#1&551433125#1&55143312##1"55147315##1"551433125#1&55143312% %  ZK  KZ  $$  &&  ==z==$Afy%6711651101#"'&7676301&767'&'11&'11&7676'70111"11111127676'&'&'&767676'&67611'&'&7676&7676''11117&''&767#11"'01767672'11'&7677&'$"! "%%>=3V -2  %s   4>    ./;;9:    #gRQ''%005 =?@-*066'' 3+,)76?   &)*! $   >   )  a     \1111&6'01676762121'&&'&74376767626766767676767013  G559 ,144X5 =56051717335 !&#   $ `   h,+  %$*/"?R%5#11#151#1514763312'432#"571111&'&'&'676767116767&'&';Mff#""##G88 #"88BD88"! 88HZ889:VQ<;99Wfffxxf?##""{!!78FJ87! 88FC88""-;;RU:976]W99It1111&'&'&'67676767676701'11#151"'71374'"'&'&'&'7&1116763513111&1654'&#F88! #"88BD88"! 88H :9V=''])"" -,`/0-_" " ;;U !78GJ87!!88EC88""$U:9) &&" +=+ ''!  9V:<SZ1111676767&'&'&'&'11&'471#1131#1131367'1#"'&'3111'#3#31173#351#1'167671&''16767621'I87 !!88EB88#" !78GV9: A ##,*  ['&;MG '<$Q $# W99""88CE88!!78JF88! =9:U# 2. 8  / ) %.99W<KTu1111676767&'&'&'&'11&'471#113111#1131131513151117#3#5171755#171#11'1'1#11'16767'I87 !!88EB88#" 88GV9: :@@=AQ&&9X:::7&?B+(BR+*DW99e""88CE88!!78JF88! =9:U 8' '88$$3t` V3$#99W -/8A1111&'&'&'676767116767&'&'5#15135#1513G88 #"88BD88"! 88HZ889:VQ<;99W^!!78FJ87! 88FC88""-;;RU:976]W99++++P****Kk1111676767&'&'&'&'11&'11&7132767'1&'&517''67671&'&#'16767"101E88!!!!88EE88!!!!88EG23O$  K,4..:(GK,,5V98!!88EE88!!!!88EE88!!>''==B#1 ,! /ddd*1!*89V/?Oam1111676767&'&'&'&'11&'6767#3#131767&'&#3#5131036'#3#1315131676'4##3#5131H88 !"88DB88"# 88GV:988ZW99;4 221!!78FJ87! 88FC88""-;;RU:976]W99)2((9./(,11/1111&'&'&'676767116767&'&'61117167147147217163311#11#&''11'41'&'1'05'&'1"''15'0145'11'&''1"#151317161716701617147632171014767G88 #"88BD88"! 88HZ889:VQ<;99W   :3       4- !!78FJ87! 88FC88""-;;RU:976]W995l<   :@ a , ]  7H  ?_  W  Y9 Lb  E\Pb/1111&'&'&'676767116767&'&'1'1&#"1'1&"1'1&#"1'1&#"1'1&#"1'1&'&1#11312713277113277113277113277113277117713151##3#1&551#1&'633151471312G88 #"88BD88"! 88HZ889:VQ<;99Wk      +3      3;N!!78FJ87! 88FC88""-;;RU:976]W99 ] 3E  -^ TC P9 Z I +N FI QH :@ S,/KZc1111&'&'&'676767116767&'&'1#1&'51#1&'516731133#351673151#17#3#1315G88 #"88BD88"! 88HZ889:VQ<;99We  6  6))) 7lllll!!78FJ87! 88FC88""-;;RU:976]W99  6  6se (X/BO[1111&'&'&'676767116767&'&'11676'6'&'21&5&767"'&77G88 #"88BD88"! 88HZ889:VQ<;99W<<<< 6) =!!78FJ87! 88FC88""-;;RU:976]W99<,,44,,,,44,,6d. j@@Nal7'1#11&"316761"#"65&'&#&51#11316536767731&5514'11317&'11&547677&'&56633#3514'&#2767#1'&'7#3#676^7777% ,"(A !  %'=$ct  3-d#*+!____mmmm "# 'P   B t6|/. '$     i%67&'7&'11&'&'6'&'&&767'11&#&#&#"#511011717676'&'7116767674707765&'%''11'1"'&771676011''11''1&771'11'&'&771&'&'&5676167&'p$      -   .-AA= #  #"Rh  $011+!  >^];:D 8""  7,++,7I45 >= Kr#$)8&% EK *+ (&777IHw!11!'11&'&'"'1231"#"#"#"#51272765514'&'"'5176327"'11&5514763114'&'"167#15131#"'516301@           t  $&@@..m  %   -E""36_01016767&'&'67636''17676'&'&'&27676'&'11111'7676''1716'&'&767676''1&'&'05&'&7654'&'&12111111#'1..'08:\23 KK_=;&$=JMRSNJ=7$  $7=J NSRM!!88EE88!!!!88EE88!! 66CC66  66CC66 12==2112==21P;7$ $7>JMRRMJ>6# '+7'177711151'177'71''117171'1'`$$$##T33))P###$$T****33,,,,+y::--/,,,,+Z----:: 9CM&'11&'11&'676767"111132767654'&'&#571&'#1116755'111#113111711315167171'1673151#1&'71'11&'51#731&'!3167'71&'#!167#751&'3167'11E88!!!!88EE88!!!!88EA4444AA4444A.%,989,$/  ;;RR;;  ;;RR;; ""*"",9/$$/9,8!!88EE88!!!!88EE88!!44AA4444AA44" !3RRR;;   ;;RR;;  ;;R%.9,,9/$9,$//$,9z"""9P 5675147676321&'&'51#''2676767363&''&7&''&7&'111"#&167670101327010167676751&'&"#&'&'5111&'11&'&'6767"11327654'&#11#"'&54767"016316751676726501&#01"10101#"'010101"1&'&'         $@$        #(** *# #* **(#         s   ::RR::   )&""&)    !    !`         C    %67116'11&#6'&'&'&###015&''171'1711&'&'&5511511'11111715"'&'&'&7"'&'&767&'&'&7"'&'316767676'101- &# ????" #& .--LM--J>55 !+''@32##!!<++ 20 7./HG8999GG0.7 0$2 ++< !##23@&'+! 55>-$$$$- #>&51145656767454'454'4'&745&5476767676'01'&5&'&7674'&'&111"'&747676567674751'1&'&''1714545'1'105&'&54'4'"'&'&'41&771'1&'&'&5&76767676676'4'45&5&#&'&'&'&'"1&'&'&''151'1716763216767&#&'&76163276367633771312727711#&376767676767674767676111111111111#74'4'4'4'&'&5&76#'&'&'4'4'&'&54'&547611#41117'&'&7677116'"'&'671'               GW A 4 "! =,+@         <                          '-      &    5) 345(! # \S>231123222333"####"'"'"#"'"#&'&'&'&'4#&'&'&'&'&'01&545&545&547454745474747676747676767676723632363236323"032323727272367236767676767676767676'4'45&'&'&'&'&'"#&#&6710"#&'&'&'&'&5&'4'&'&'4'4'&7676767711230#"'454545654545454545454545676767676765&'&'&'&'"'&'672330213676745054545454545456545454545454545454545450103747416767676323013236767676767'&'&'&#&'301"1"#"#"'&'&'&'&#&'676767'&'&'&'&'01&'&'2232323232721636016567456767654745656745454545454545&5&'&'&'&'"#0'4741676767011161110#&5&'454'"#0#"#"#"#"#014163252767036345&#"1&'&#&#�270125476772723323001""#001220001"#"#"#"#"1"#0#4505514545651167222#"'&'&'&'&'&'05&'&'45&545&54765476767%11310#&'"'�'&' ( +    4  +   +   (!  '/  i             e      "          l      '  2#  ,A  &   -<  #  1                ; 7778               &&-           v671162&6727676767676'450#&'7676767677676'4'45676''&'&'&'5167676767#`#+*-,*$%B.5"*/'+"2 )L,15/.!Q:K\''1117117117171'11'11'16'711711711&#"'11'2#"'&54763"327654'&#FFF;FF;Fw [[ wF;FF;Fw [ [ w2&$$&22&$$&2####www [[ wF;FF;Fw [[ wF;FF;Fd$&22&$$&22&$$#### 9Vq+>1111676767&'&'&'&'11&'11&'67676755#11#1131131513151#15135#11#151#1'13151311#1'''1111711'17'771'11111717'11111711'77'11111711''1111676767&'&'&'5#11#151#1'13151311#1'11#11#16767&'11&'47131131513151#1513151'''1111711'17E88!!!!88EE88!!!!88EB54  45BB54  45B›%v0TTIS|O  4   t  ?4334??4334?_T4u(ƒ .''Ǟ76H[<< ,s@TS0<<[E  !!88EE88!!!!88EE88!! 55AB5555BA55 I///R./#-P8E       Y  33@?3333?@333332R3RA()U<<[ 8?39P[<<  !&/<'7111676767674767&71'11'11'11711711656'&'16'4'1&'&'&'&56767676'1171111'11111'171'1'11'1'1711'1'1&'&'676'7171711711711'11'11&7'167675171171177''677&'6705&'7&#&'65'116767&'77&''67&'0547'6367&5711&'&'67  4      :l,! ,k:        4   O           $$%#- "&"!#  $%/"#>']<&1xx1&<]'>##/%$  #!"&" -#%$$  _  2  J$.  2  J$.&S7'&76&76767323231"'&'6'&'&731450567676767624'&'&67116'&'&&'&#123632767676'7671165#1'"'&'77676'&'&#L $ #$-J..l  ( "**81  --F,"# s) "++9   N 8++" *G   ./K,#"!"  ) "#$+,,C-## %    ,7BiQx%66'&011176'&767201760156'6'11&7711674'0111'&76'&#"276767674'2#%4'11&511&'676'&'&'"'&74'&'67&'&10'&'&#&1376767654'&#&'11&'&76'&'&'&76767601""11"'6367676'&'&'&767654'&'&'&767631227256763"'4#&7676'&'&'7676''672100156767201003&0'05K 6   6  ,  !- ,,)* AB@A  &-- A  )##  '#   $$!  5$$    O    ! ..-. CA  0  r4   4Qe                '\7517151'51111676767&'&'&'7'151'1111'151'1111'151715171517111111!!!E88!!!!88EE88!!!!88E!"!";<<;BBB!!B"!!88EE88!!!!88EE88!!bA!!AA!!AW;X;LL;X;Wr(;7&'6767&'7"11'116767&'&'&'11&'6767O'(-22LK2323K9%%%%98%&&%8$L1221LK12%&78&%%&78&%E%11'&'&'&767677111&'&'1&'&'6767171'1111315" "."-,CC,,)(=mmR6589Uҭ -('#")C,,,,C?+,(??&99SV9:&E#&'&'&'676767#&#"74'&'&#0101017276'BRE88!!!!88E_Gc=<((,4#c&#"&(! .0-1!!88EE88!!?'(L6"!  6;!<d|777163213271171654'&#"7&1#"'11&1111327716'776'&1#"'11&5471171&#"111327'7716321176'&#"11w('('w('X('iw''hWw''5+DNXiz6111''1&'5167"#11"#1315131676'&'''676'&'"#"#131513113'11#15'11#1571111676'&'1111&'&767k     *C " ## #l  mm  \fe###f""T!&6j"11&'&&&'&#767767676767654'&'7&''1#11&''1&5476313171671317167 & <= 'AAA $# (' "$ A ,- -,$~*  *! 4&;, 55 ,A(3 %s#!uu!# " C>Nj111101476767217'1&#"1'1&'&123276767676767632371&10327676'5111577&#"01'&'&'&'&#"011172767676760137'  s### (& #B    Bs  SSS  SS S<  #m00m  %'      U|||      |{      {71111676767&'&'&'11&'&'&7667676E88!!!!88EE88!!!!88E''44''  **  !!88EE88!!!!88EE88!!22  ((  6&'11&'11&'11&'6767676767654'&'&'11&56345474'45#1'"#"#745656'51"'4767#131454'&32322'&!! ! '''' ! !!&'P P@  $$--$$  $$--$$ 2/.X CG&' 2+''716'&##1"114##1"13312551711331270E33nC62m2?!!!1!1676514'&'#3#511'11#1513117131''31513113R$  $  >>>=>>>=>=\\\=>=   . xMMxMMlllii+8EN#3#'111#1171311517131715113171#17751'1113311#11'11___lVb(m{WaCHU4N4PPPOIH(66SPߌHHHH@\?q?2335';;;er5FF=fff5{/Qp5311713151##3#1'1#15131'#3#653145&'#167"032767656731#101317677671476'05&'&'167316'&'1%671167&'&'&11110171&'&'1"11"#11"#11"1512767676'&#763631#1311'"'"'1365513167651*1za Iv4443X  4 B@  6 =      = +*67$  &l  -z,^)! ,  K2$A     ;  Ge d G ,I Uf!!!1!16767&'&'&'&'&7676765#1513151#1513151311311#113151&'&'116767&'z44#--/&&04>7H \nn3mmX &'$$ +'E(2"33#   *]v%'&'&'71676'&'&'&&5&545&11&'&'&'1&'&'6767&71'1041&'&'&#&#1111711107136767610767171&'&''5721'171'6767671&5271216&"171&'1#1&'716'&'6'311#1&'7767711711167671&'23012351'116767676711163151'1&"#&#112331311713167513216762111&''&'"#111012&'&'&'1&'&'&'71&71'1"4'1'16711#111&'1&'&'&'1'1'&'&'"17'11&'101&'&'767037271'17&'&'371'16367277#3#100'111'11#1'11'111&5&'&'1'"5&'71'11'&''11676767&'&'&'6767667415'31676367171116'171&'&5&711675171167677151'131171'117111312111"'&'"#'7'17167276767&'&17&76'&'7511&7017101&'&476"''7116511&7&#"7#3#12&'&#1111'1676'714'&&#1012767&'&'767676"''1'145671111101'&771'1&0167017#1&7631'11    !#   5-  !  .B\^?? Z     (      '         -       -  ;,, (@       s!  !/.,-##      5/    )          -(  D      *            ,   &  !)*/<9:^              % $          &%)          ,'         T     g $ /  23       8     8ycE~111111#1&'&'&'&545454545476767676711101011'0'&'&'1676767623270131551014#"#'&'&"#&303"#"#&54323274565456&#"#&72360125514720331&'21"701651"'4'43676767&'&'111&5&'&'&''"#6727201'&'6'&'"3'&'&7672'6567654#"#"'&567433232'6545456#&5676432327'6113"741&'&767674721'&'&767#3#"'63545456'"763207254105456#&73160#01"30013"#"#'&'&7%11#&#"30#"#&76'&'4#"#172#1&7276767676343270325415454#"#"7010323"3'6&72323236'6&#"17012370160'454'"#&7765656"#"301&76156'&01'1'4'&7674560101#"'&547601"1&03765476'01#1&703274545&&#&72323'71121"#&721545&#"#&70323230#"014767676767012#"#"#"010'&'&'&7476#1'32376'&'&#&711'&'4745765&'01'11654'376'&'&'' *+  "!(()32%% %*"! aa      !    ()  XX W   ++4           P    h        &  % &  '&Z !!) [ j    P }~""./'' 87      0   FG   32&% "JK           W     A  %n   j   :! .     hZ%0;r$)Cn}'L%67&'&'&'&701&47456'11007201&5437&110127&#'6''&'&'&#"#&54'&#"#&'&77'7'112632016&'#16701#47016311167654'&#556'%&747&7654'"311667"362767"#&7017"#66654#4'&'&'&'&'&'2#"'''&#"11'27251#67116'1101&'&##111#111123276765416'&''231161'"#55236131'"#7'5171#15131'111#11113171#71111676'&'&'11&71167'77#11111'171#111131''1"317&7"&701&6763&'&"#"#&'012311611'"#'111&'&'#111131'1511131517'"#11"#11&'010676"010351236'0111676'6'&':  4    '  !"-  '  8    )   e%4IQ<& &' %[,,,*-,*#    '         4N  L666!  m    ' NLN   BBB&&B '    - *  M0  U `     *<Yk7&##11312765514'%!!!"13!127671&'&#11#151317#3#1311#11311#1&'516731'11&''13117131xh  h   /0 e555 5>?h  & !&h F  h GX&&}srr9v7171'2511071167676&'&'&&'&'11'&'&'&'676776'&'&'41&7676761216767117711'ߨ:              C:      <       e}1@%|NW($3@N71176'&01117676'&'&111676'3276565'111131676701767&'6763&'01167&'6776'0161&'&'&''11&'&760177711'1711'#3#6'&'&51671101&13167673110#&1171"7"11516'&'4'11"#1'1116767613111&#1701701111151&''11311#116'4'&'&'&'11276711111672731'1&'51236711301751171&'&'4'3167121#161131630731111"#&11112767317#01"'&'&76767676'&'1712160171&#"#&5&'&1171111'&767610755214767611&011&'&'716'014767&#&76'"'11"#5171454&1114#�3010'63112716'"1711&'&'7101#&'&7&#&'01073176'&761"511&'1111'171716711&1𜥷117''05654'&"'&'01711'&'&'&72017&'11&'11&'"7111'1676716571171'11171'1276'&'&'&1711&5&'&'171'111&'&'&"101'167671'171171'171171171'1711714'&'171'116767121'1161117116762'%27101&'&1117'1113101676717654'&'&'6'"3767&1176#231134547 Q/)11110/), 2fJK**09:!*==I=""    ))??Kc       7  -       %         *       #)(A( !U[! =    "*$ )!  ( _ ;  "  %6;<h    ,  -[DC&&!"GGq =f L &+    !"$%  12[6$%    7-, Gu     ,       X  s   Y   O     ,       P+% & D 3X +^%  ;   * $  +  =A= !!Jr '&| !!327 ,54'&  + )%77#111113#371131XXX 8 ̕ v!'_bi`D%S}'9Diw 'D9L7771'171#1'11#1771'171#1'11#1#3#"'551463312'45&11&17117456##3#513125514##1513125514##1"133125514#'6751&#1"133125513113312'''#15131274'&#1&13312765713113312''77553125514##1"13311331257#3#51312525514#4##151312165114'0##1"#1"23312161514'0#'#3#"133125514#'5514665514##1"#1023312161513113312''#3#513121#7#3#0#1021310361513125514###151312''1#111711'177&'6'&'&67601&'&'&767&''&'0#&'&7367676'&'676'%6711636&67&'05&'&54711#'&'7676767017&'"'167&'01'&'&'#&'670#'#&7670167&'01676767667&'011167670#'#3#&11'55105&#1&1133125510'&''1#111711'17''1111711'17'#3#513127055141&##1513123455105"##1"111003312161514'0#'7#111711'171#=]Q  * O  P] .   V   $$(( *+7/0    6 ! 2##0( B600    r]++1//+* 1++2//$  $$ 88  $$vj  <  89 < 2!"s  &9 $ ( < ;& ; 6666??((4  $   ?  !?   F;(('&  !"= K"" $$& } -&  !"=K!" #$,%A" JA">  ,%(%#01 %&" &r2  244U@d7'!1'7&'#117105676''''+++;X) ssstGKKKg##@G-57&131276'&'7111111331276'&'&'&'&'&'&#" } 2\4$  #"$# >KK8ULLEFA//FFGG12%6711671167'1&547676767'&'&'01'&7476765'&'&'&''&'&''&'&'&'01'&'&'121276767601314'&'&563010'&'&76763         `            -4ETcls'15'51#73#311715131'''#151115131773#351'''1#1113117%7713151'171#!#3#111317155113'3#3'17'1#111135#3#17''13'77#1#3#51'111#1'7751#11'113"LvMMM- ,,, -8 88 Ollla888 8!!!Z[ P=NNNZ[M -mmmL!=[ZNlllM=LLL-LLLm--- ,7o[[[Z!P^MlMMMl 8 -87, -a888- ,7PZ[[ZlllL L [Z M =LLLl=MMM-g 7aZZZ[ O&M7170167670501716'&'&'&6''1&1'&'&'&010117676767 j +*Q2 tHI)* j **P3 tII)*$ B 4(  r6 ,-'8 A 4 (  r 6 ,,( -6?\es|73#371#1'53171#7"51147110167676##11316767#%77#113#3#1317711013107676'&'#113123#371#1!3#371#10133#351#1773151#3#351#1'7#171#113171#33171#;;;;RW3)dD=(((>(>u___[o -vpIIINC;;;; ___ZMI VVVQ:(':!^ 7 5555 9 N55<t7111111#&'&'&'47676767&'&'&'4767672254565456563232367676767"&'&'&'&'  !!!!  !  ]   !"   \Zbs%77#11'1#1513151#11#1&&'&51#1513151#11315131767#1'&'31673113171131'%6311#&'11&71167#3#51311#11311#1131'5531511151#7#171'1311713111#1'J555>w8  7''!!!!!!!!V:999WB55f  f55B----d%6'&7&76'&'010132101312367&'&'&'&767676232727676"#'"'&'&7636323237454'&'&'&'&'&&'&'&'&'&7676'&'&'"7674'&'&7632'&'&76703316'&'&#&'&72323236Q  /p    -.64+((!  "33      !!$  2                  %"'    %$ $  (5BU&'&767&'&7677&'&'&'&''&'&767'676'%67676767&232%%&%%%&%%%&%%&%%a@AM (!! #%%&%%&%% 3-''-IA@$ u++++++++iH++$ %Z++++T#@QRD!,11+ % "#?{->P`7#11"'51#1176751#'567676751&'&11&'&55167653151767&'&556#&'0171111"'17674'&'&'67251&g ! !c21UT11;EEAA0f)*WX*)NZZS    O  hg$ iJ&%!!&%J >!"$$"!>D lE70veee- W      %` ?c%6'11&#101632763276711676#'131&'&"#1676767'1111210!1    pE !)43GGp&*40&`34$B2w10  ))<<<<((D  ]0     @f%11&'&763&'&'"'&76701#'&'&7&767&'&7601676760167647676771111&'&'&'676767&'04'&'676'&'&'&&'&'0101&#"117276767676767676')       #  f!!88EE88!!!!88EE88!!O            g        $   YE88!!!!88EE88!!!!88EK!%       ?l7&'&76'11&'676'&#'&76767676767676327&'11&'11&1767701676'4'&'&5&% 2"* ,0%'   !! /? !42', 2K/$,,$/I A-,),85' && 07DC1 <;  i455&% (- %&5 \enw%6711676'&'676'&'&'&' &'11&014767'7767501&'&'677676'&'6'67'&77&'67#&'6767'6767012'&'&'014767037&'&56&'&2&'&'1&&6766&#7676311#&'547  "  %9  ;"A   '0" ""Y ,N!,3    .' '## 3E0   8;;*+(-A   !# 4! ' 6( * " 1)- j8$ 8  &. - ,?5OJ 9--    $,9'   9 -9 =Wc%&'#1131677&'11&76'&'!11!16765&7676751&'#3#513121#'#3#13167&'N*3+2 '' H '' bbbb! ' 222446!G$ 0000mO'&3E%7''1&77161771615''&1''1&117716'%'7716''1&1//////hCaaaaCCCCbbr[[[[[[!.<L!!!"13151!11#113127671&'&#1111314'531&'&'3#3&'&'&'1 +  U@.+**@+++ 45BR66 @@+ * @U***-?+*A55 +66R11#11"1"#"#"1710&7116732765116'&'"#&'&''&'"'&'&'&'67232767676545&7601212'01"'&'776'&'&y   mO        #"# "  ! A   Q <o         %   "=66""8 @k111676767671167656765676751&'&'&'"#"#11"''767676'&''&'#"'"'611667601'&'&5''&767676711711327237511&'&'H  1**3788   +JJJI*    ") ,, "   **)  "]    :988  98:9 6##/ -  - /##0   $3^ C%07#3#4763670#11&117216765&'&0101751&#"%11'''&''&767&7676767264'11&'1101&'&'632707674'&013#"'01&11016571013076720&#&767016551016'&'705"1#10#1112131030570111&'&2765'14#"#&'&7413125054'4'67&'&'"1&#&'4720767654'&013"'4#1130174##1476762125716#01&"#1"1331"1'4767676767312501114'11&'01676'7&11"510'01#10#1101131070151&760125676'''&#''&5&76327416741&010127657&'11&#72765'14#"#&'&7413125056''"1131&   10B#$/+,*+=##2 /<&!0 0,,        /  8 %$     B   6.   /  6   % D(( 01 %$33!)('0" $$2  + "O25  :   86  '  `9Z7#3#"'&'&547676331#1312##1&'&76731654'67312765514'&##1654'311rrr  r   T* Av""    x3x""1111676767&'&'&'&'4767&'&#76'&56''&'67633674167676703&'&'&1'&'&7676'&'&767667676016E88!!!!88EE88!!!!88E   '  '      $   !!88EE88!!!!88EE88!! +  *%&!  /J     4 .U`k%11"'&'"#"'#&'&7&'&76727676767676711676'&'&'622323676'63112#"'363112#"'&711611367676&'&' >  9+ =43%%=$1G       8=co&'&1111151&'&1#113117216767111111227676''111171#1&'514''1&76331217167271151&'#11111'131675117111'1'15171717171> gg , n5554  %% n7s&Rs T3x'!XDgg0<aa[[[..\ FF  =PC4+RB4"H TTC%''&#"11616'&7'11#"'&76751&'&7'11132771654' (32  /  2 )42.z  {  3  BW^e711#151317!16'&747334'&'"'01&7#1132774'11&##11315131676777#17#3#13  @1   0~ 4!11100*@@      &8 / ] BO`iz%11516727654'&'&'&31&'&56763231&'&'6767'"'67676'&511&71167'2&'671111&'&547&'67#67&'34QI/.$$#$./Je779:kV77>=auAAAAua=>?I+)R $ $+*++H$ # I? 5*4  vF&&1J/.# !./J1:9hk::&'HS--AAuuAA--SDI  b##3IC&'    86I`p1111676767&'&'&'71312&#"73#31#1'11#17131#3#7136767&'&'713113%#3#13127676'#3#13167676'&"# N?@%%%%@?NN?@%%%%@?NUM/ ![ $ % ! \5h     32??2332??23#" :Z##Z%= R$9c0  _9!,:Q_o7317113171131'1#11'3#3#13176767&'&'&#556'0176'&'&#1131276767&'&'41101#157751116' ,-. -)*0000 4.3  PPMMvv0.fff !" J !   m,3<L#3#131676'6'&''1111676767&'&'&'#3#513'&'67#3#5131'.../2+'E88!!!!88EE88!!!!88EQQQQQ94 !!88EE88!!!!88EE88!! '*J454'&'&'&'&#"##1"#"#132331232767676765455145 ""#1#'&'367&'&'&'&'&53676'&''      F&%)B'+((+## #)))@/. : $     = !''$   ,&&?!"%''"$999%m1111676767&'&'&''#1'&'&'&74767456763111013312767654'&''1414771312E88!!!!88EE88!!!!87F 77      !!87FE88!!!!87FE88!!)  )  )) #M2p , 6! 4 : 9 F : dq 4 X .q *G 9Copyright (c) Font AwesomeRegularFont Awesome 6 Brandshttps://fontawesome.comFont Awesome 6 Brands Regular-6.5.2FontAwesome6Brands-RegularThe web's most popular icon set and toolkit.Version 773.01953125 (Font Awesome version: 6.5.2)Font Awesome 6 Brands RegularCopyright (c) Font AwesomeRegularFont Awesome 6 Brandshttps://fontawesome.comFont Awesome 6 Brands Regular-6.5.2FontAwesome6Brands-RegularThe web's most popular icon set and toolkit.Version 773.01953125 (Font Awesome version: 6.5.2)Font Awesome 6 Brands Regular      "# !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~      exclamationhashtag dollar-sign0123456789 less-thanequals greater-thanabcdefghijklmnopqrstuvwxyzfirefox-browserideal microblogsquare-pied-piperunity dailymotionsquare-instagrammixershopifydeezer edge-legacy google-payrusttiktokunsplash cloudflareguildedhive42-groupinstalodoctopus-deployperbyte unchartedwatchman-monitoringwodunotdefwirsindhandwerkbotscmplidbilibiligolangpixsitroxhashnodemetapadletnfc-directional nfc-symbol screenpal space-awesomesquare-font-awesome square-gitlabodyseestubberdebianshoelacethreadssquare-threadssquare-x-twitter x-twitteropensuse letterboxdsquare-letterboxdmintbitgoogle-scholarbrave brave-reversepixivupworkwebflowsignal-messengerblueskyjxl square-upwork web-awesomesquare-web-awesomesquare-web-awesome-strokesquare-twittersquare-facebooklinkedin square-githubtwitterfacebookgithub pinterestsquare-pinterestsquare-google-plus google-plus-g linkedin-in github-altmaxcdnhtml5css3btcyoutubexing square-xingdropboxstack-overflow instagramflickradn bitbuckettumblr square-tumblrapplewindowsandroidlinuxdribbbleskype foursquaretrellogratipayvkweiborenren pagelinesstack-exchange square-vimeoslack wordpressopenidyahoogooglereddit square-redditstumbleupon-circle stumbleupon deliciousdigg pied-piper-pppied-piper-altdrupaljoomlabehancesquare-behancesteam square-steamspotify deviantart soundcloudvinecodepenjsfiddlerebelempire square-gitgit hacker-news tencent-weiboqqweixin slidesharetwitchyelppaypal google-walletcc-visa cc-mastercard cc-discovercc-amex cc-paypal cc-stripelastfm square-lastfmioxhost angellist buyselladsconnectdevelopdashcubeforumbeeleanpubsellsy shirtsinbulk simplybuiltskyatlas pinterest-pwhatsappviacoinmedium y-combinator optin-monsteropencart expeditedsslcc-jcbcc-diners-clubcreative-commonsgg gg-circle odnoklassnikisquare-odnoklassniki get-pocket wikipedia-wsafarichromefirefoxoperainternet-explorercontao500pxamazonhouzzvimeo-v black-tie fonticons reddit-alienedgecodiepiemodx fort-awesomeusb product-huntmixcloudscribd bluetooth bluetooth-bgitlab wpbeginnerwpformsenviraglideglide-gviadeo square-viadeosnapchatsquare-snapchat pied-piper first-orderyoast themeisle google-plus font-awesomelinodequorafree-code-camptelegrambandcampgravetsyimdbravelrysellcast superpowers wpexplorermeetupsquare-font-awesome-strokeaccessible-iconaccusoftadversalaffiliatethemealgoliaamilia angrycreative app-store app-store-iosapper asymmetrikaudibleavianexaws bimobjectbitcoinbity blackberryblogger blogger-bburomobelexperte centercode cloudscale cloudsmith cloudversifycpanelcss3-alt cuttlefishd-and-d deploydogdeskpro digital-oceandiscord discoursedochubdocker draft2digitalsquare-dribbbledyalog earlybirdserlang facebook-ffacebook-messenger firstdraft fonticons-fifort-awesome-altfreebsd gitkrakengofore goodreads goodreads-g google-drive google-playgripfiregruntgulpsquare-hacker-news hire-a-helperhotjarhubspotitunes itunes-notejenkinsjogetjs square-jskeycdn kickstarter kickstarter-klaravellinelyftmagentomedappsmedrt microsoftmixmizunimoneronapsternode-jsnpmns8 nutritionixpage4palfedpatreon periscope phabricatorphoenix-framework playstationpushedpython red-riverwpressrreplyd resolving rocketchatrockrmsschlix searchengin servicestacksistrixspeakap staylinked steam-symbol sticker-mule studiovinarisuppleuberuikit uniregistryuntappdussunnahvaadinvibervimeovnvsquare-whatsappwhmcswordpress-simplexboxyandexyandex-international apple-pay cc-apple-payflynodeosireact autoprefixerlesssassvuejsangularaviatoembergitterhoolistravastripestripe-stypo3 amazon-pay cc-amazon-payethereumkorvue elementorsquare-youtube flipboardhipsphp quinscapereadmejavapied-piper-hatcreative-commons-bycreative-commons-nccreative-commons-nc-eucreative-commons-nc-jpcreative-commons-ndcreative-commons-pdcreative-commons-pd-altcreative-commons-remixcreative-commons-sacreative-commons-samplingcreative-commons-sampling-pluscreative-commons-sharecreative-commons-zeroebaykeybasemastodon r-project researchgate teamspeakfirst-order-altfulcrumgalactic-republicgalactic-senate jedi-order mandalorian old-republicphoenix-squadronsithtrade-federationwolf-pack-battalionhornbill mailchimpmegaportnimblrrevshopware squarespacethemecoweeblywixello hackerrankkagglemarkdownneoszhihualipay the-red-yeti critical-roled-and-d-beyonddevfantasy-flight-gameswizards-of-the-coast think-peaks reacteurope artstation atlassiancanadian-maple-leafcentos confluencedhldiasporafedexfedorafigmaintercominvisionjiramendeley raspberry-piredhatsketch sourcetreesuseubuntuupsuspsyarnairbnb battle-net bootstrapbuffer chromecastevernoteitch-io salesforce speaker-decksymfonywazeyammergit-alt stackpath cotton-bureau buy-n-largemdborcidswiftumbracofontawesome/inst/fontawesome/webfonts/fa-brands-400.woff20000644000176200001440000034613414605646413023063 0ustar liggesuserswOF2\ e6$ `l:ʋ8ːp %2q<֟eDOZ-UUU ݫ~7ß?v\77")#rzS+]-%2/{&D̋|'F+e  _/" OsP;}U'VH P6`"1+KO̯STɖR۶dKl)!'M 塞g@%#8l"`E'Z?o43(KrlrҤMݔ`M{],c/GGCUwU[u7LLn%r֖I2X)vs71BU}] `Q:A EB!Vٖ-9Վ\\R}/zןK$Zage"O56Vcϴ+g t.Fk'V50$&DdJ4n LC&'3׸ ]k4ߗ _(GnhU>>_,I*-_X)%Jd-}E8:5.'ԠO f굣n۹Zנ'2ƵÕ+-1'ۤJ/q,gq4s݁2~c" T(Zy7o|E2}Ҷ"lm"%]sV-]aU+,Ձ%9)\G=1Q%RD ̠q._752e\6;AF7Ub͏%I xՍQ}USv;vР\/Sf!};Eǃ.ETJ.uk 6 _u~E\ߍq0?mRY;双>ZoCb>-H|l]?u(ǭ"JS\N>iRSS 2,;:Ǣ+3jnuR gI9w<utV= -_Id0h8C b \8.^ m? $V !zo!3dP@g]tzAo}0`Ca 0FhpΦ9leeZZDkMf:+;_ygggcZAinѺMϫvzW}>N]]}ubQ¨l,6q޸n5ho*nޚXs9˜g.2W#Y|n:M@f yB7='ߘHmJ7yzYҫo/['8Pj\(?woP8P,TP]@+A44ZFi m]A:IW#q/y 9W:(_+|oM1`'2E8NfeY瑺hDu]h0G3S>n1W3o3Δ!Sj_33:3^x1CcGٿه+ړ졶#lQjIWͭ 5"t Yx{S~^GDza6d$"T(C|T^*ϔMrIlW6+[S]U_WK+.[SlVlZlT^,Y,^,xg=o7Ǜx]&^M*^/ƋExx6xR<>%w-[B}ySC}kokޫTZmLmtO{TwTݡuu媋VgUgT'TWޫ[9weʊ+ 0to wpÄ úeIX=,Iq~A©?E~u~ìV_mݬ\9vէv_}#被n롯~`AbaaQFcqƛ`I&biaYf;NwOCP~adGj ˰ƾ0OLtt,YǦmC.NC NF`C#ˡQhvh v?4{=^&`CN/dwh ?4MAfC3qȡY87fAx<<!ϋ ](yI|J^:"oI{h.yk6h#oG ={G4GzGE|'Ѕ||K&Ѝ|!OvFo HJ|;veI|'n*az'%]ȟ IJn0#Z;:@=jLtZG:0h@b \r:ث^Z`omf6{yQP`iπ4G}~}a%MCС`?](_t4:o4G}7t%ؿAg :s#.7.]npK7st; g@wۂhmnp;=st/w'}-~p{p e򵴨\n fCP60:sK}(ou>9ys1'P>6GB}+s9P9G_B+(7G@{pZsם}/B%Џ~gh2~xn4B?q_FW^mcmL#mbs[yn2nY%6cHyunqe"nIMfLju㪴#eynչ!UYMͤ*8HrF[@(@Q 9M l`Y“RuiaL2$n6XJ°ia8l⹾\zY&ٶ۝f68~J8w,!q"55,KmkwBޏJBPNYp0t\+Yq: qtW0t{.ܝڻ㬖ka F#ܝFM#XX:'VALn6/}yɓsBėGe 齄D!'DxRا#ĺ^7{gۯ';T_Ox BEʤ&ᖞ bSSqUN'yf 죱xt"aĔf1PEXZݕgyO+cq'<>88==8?btvZ4ǜA3 n"dR?v < v*szP?0p6lޓ`:;&ǘȱtfPpn<3*]lb*,hBޕk;v:yZ'pEvl_>9.j&ր+`N '1eQNycu; nGZX:+5f8T+>r<;kwjQ*{(W|80$!oR!g jCU{ c2X&;V(Rk7⃽ ~5RQ*V^ݯ}oHz뮌wVoK}l՗+dْRo{xKo^k;?V˞/`ߋRtG*R#3lgy#ŊuUe1ֱt\O avfכRƺұ{WxR8{xҎ[lW] @[=oc@ ׶/l! ?ܸZ B,.NŎC2h`k/IeŋfהUaFfdr~:Z5=Pd@LòWia0,gpLa^;@љ,{-rΑK:`:F.; &_p<.!Fژ؛G.VNTV+lh{fF?܍]l|!=2;ؿ1V?8˱Wx̰3.ù'2.X-fBBw !lᆡ` ~fH̙HYxXcG@s( |񤽂5jEfNt+O&R|K0Z>1F`x)Ӥ8SDf0c{X w^uݨ}$ &F{9ill Z\#^bKt!`˱5/ɿ :DG,\(KF$H;v:;އzlweČ0ee#k~01v>\e5?>f:s,N 7L mYFnHie?;JofI!BHFw=zt|(WgBR&_ (g[ߟxw°e"e@NtJ? i`c$z61ͷb{0, ,硐zί?-@AVlH'/95W#sqt\gNk_?}Sutq+޸qp|||+8qN4 EZ!Pz}\lnlmGggggk^B>l >si pMf/]pQ6Btͨ.w>8[t#gwU띙[@'F 7VGB_XwyoO=|k^h+vSrt]glu3sX1BC5UF}<>YkTh\4j~o6\hJ/5A 6ʚsh+4.B %r$F[jP~zYۍ4OT~ggys>ཛR*ksݶ×8՚WcF#ض}^c+/9u<`y;N aբ.`A߰?ޛZ?A$MEJn7w/_bu~c#`LЦhspjs$R'O߇m38mWW{yla]rplðbkK" >ޔcpo_dzt kT{궧b!EI7\Ǝ{D4|[on fXs '(&`q G=JnB(vxsXL$>% X`>SVwd Ktc=R=ɪI":Q'Y"{d);F8Zا<'pH_FT%@`Khmۭ\=hwkw=vdn)@}ɉB˔P'0Fq@}㓓g=9>LP n)xgcBocF)2B-PNxŃ| 9akih2z@/n2p0x"mAݪݢ+W8I@_/;fV5nFI2&ftcfFDߗ.a KtPO,[UfjQ2SSj 4W4$% 2LMn>= ?} C_^—0{|Wy"ZDh(+Y> ol:7882`ϓ/-[,NSowb%21*qשez}1z'.UXk?^Ɠ4I4khJ$Vb\ mQ,c* Ǵ7M+$M$Ϧt2T,b\scnH{=W7[!3K5g۔kE!0b#Bž jiT9~8^v6@_/Vuj7#xwiQ,RcB5?TFt0? އhTNɗusz2j}kQ$Ny@֢H)}+r^ Ǹ~[jACcFPCb?__E1^EA߂L$,T&˳)@.MQ>yrZf#ux>^YתΌes\^뒲sh] (M%ƄޥKdDRqg99z'sj xe)2nl0  :&K(B.B ބ{vH ]CS5Ui ?8];<7˿Bюv ܹsg'dN}L{;WCB T=LIeԵJÚ/꾙q[Lf_rU^IZV slqӛcC7M2=? )0F#ۇGQMn7'!dp'7oE2f0莁(ue.a&9Xd'L$Vjrwx#CLn;8#^&77>5unY^W:Z~VwZ; |_5kBڶ"O|v7fjtp>> `؞l6%\!CEB@݀Z3A^hm=-8lEq^n9NH_Qzׯ;7WJ7|7~!8!<_?.V8Ah<^n&f4WILM%kM Jo\&I*n"c_HZ '$kRm"Γ]mb%Բ/| QgcwEkʌh2enLj`~xaRT:P|h$!fOf┱2&:8N'U* exU\jq+շB>RzP8li$ Yu|w(s1ɳ];}LڄL[bic - fES}BB)8+B)DSB%,[ c@b5hRBLH??Y` m: E7Kjw3zmlsp}߇'L^gaLԥQ%N\vܯ 58+=AhZ2vv}ՠ^ $8ROH@(0Qƽ/0-fa&"_zގe4RK) f8c,$?>a1,F΢5 (JrHlLDҖmau,;Ymny׳^*,a~*CV(#-𐞿ȌFibAьtԾdg' 9<бy5 ma؂W{^Bj+Dwi*Sr5'?Oy~9/#h@*3Nj^h kڗgynS++5HG,W`@S\vcl(6Ͷ;m :\1*  g0 sBƘ*p+7$F1t9SU1jr0 2Bz sH:qXݒMï^zAggk ?})j4էRf"Jq `Kz4k{eznvxo!#X )za,M7&.UeʼŒ47YDY:$ e-?ɾ,<,/|x*k| 3L>/XBzx!!i{>xg"xZ9#v{v'I-˲Ҥ_Єf^=aow^,s`66'W˃?&Oi6J>m :/={w>??}(З~ ~G(,zś)O/1+V<8}t;ֲڌ;@L]DӶaxr;&ȳL!@ Oj7Ȳ]̶, Ôinw8Qszwwa5ōF:5aq_=r'rz$ R"ZcN7%]M#22a-fbW~lhB'}۴,H: `z#1bR}Ȃ0~sc? *ZB@O;`8&u-]E N aR[q9~G}$i w?Ä(BUx!NmYR ̋2f9?/4y14|~4N.6C#UF,t4(2jhGpFbVlD sg"˹?iԿR -˸TfSqSٖ) mA70{ 00 lv4ld7A^:@QL<C\SQku\0L$AE-z>aPhE@FYRt)E.H)E0`Z>x׹a_8 8^w0b|FxAaPJ8vQ x{5 +J%t(ECjoSA!?12&9r^)BYgY9(*մ\TU(ٸJt6TlEr*q658qL<fSK .#KXn*|ٸ䕬SuR"\&sr5yy* 6!eQbR٘ORE7a%.؜sM=G9]rpK:BzQ_j׵ֶr&֧zv/;ֆ{a@kцW pKEqcfʱ֧NilG5~Zk|qU;BOI~p@Yry|۬o-bʲ,xTٸXK %XJLI0o,KEjufټ, C~Vv ͹НF2~L)a f UT58[F>;XuK 9yH]W Af2F}?@B2'ȶ)1Z`Eh׏B3jƺli0^ ڠ6P!i4^|OvPBpdNHP|޿VT,1}1QȺ)ȦeGRaX߫dW']Z[WŦqU5u{nrUXWh'IvF{U^;zMP47*j=TvkܫM*պ!B 9^6}YFi 4)TiY?_UZ_:Tt?勋/pp?^Ե IA~?N^6tG2˲׏_Po z>4j5W@Ju{?NJr'!#fX& (RYR2$Uۭ`֓1u̲tV[^,ozdyVtkZp]q'te cW8~թb +)EěmZ'=Z^GG\#~+4g;JGN5$~9|\&9&'ɵB,$ ˲KYRP2EQ4-ZZҲEV2ʢ"EQO3MK +xRðN DžWR՚?]wuՏ///Sf`\X`?e I]Ja03asEQE/7Ϻwꫯazys Ԃ!Qer|w&RHQGMI9IiFY ՈŮ.Srz^ZDzH.U`ܖte$KNq9ME-pAg|0ϋ1J-Y[wln1W.ɴX>Yazck)}Z*,us"{{0^q/gs B)*)FC%5o;6V]AwP0x+#Gz=x03DJоykC^+&ct2A`Xyٍk*E\1cfکxP0Jgcx=g%@_.N^]@hq04dSJû7|f0xByo Z^y(g}?A" Qܦ5x@3S';wRQ 9nRΑ6n懏tQs =,3z1N;ZqFh6 rQ)g(=۔3?Ãa>H r-!y38,b\; Q(7s oA?8 S m@8GZZٖ lLo5%[[GumYZ돜ycmu(-0?ߣ58^[ˤe{{p($[C~+{ :v(}.B^TBRy`ƃI*[z~{>?4 ͕ qD!QGf5";v9v=RZ*) )ᶾٌ!F1bkUڋۻ+˽~tSbb8!iK) }iRPSせݎeuAF>:ٖ_qNY&W Tlb9 }߯"X\kKYr,e'UmB ' 8:)}"䠘Uܜ gQ A`VV2Fr\|RYe1le,Rg5"RrG=fK fFڽ$,܏cҼ4/A<չȦȋtM'EQ=)yn8l8vӍ{{-#nv=$<^owH kJC2(";a}#N<eaȘe 8]4--KHʶ4Jp820n&B m'(eH)CEF)ҿA Rkz rd)rPJ" w qE52d`@w; hJn@8w0(P Wg^z(n2Q9BX&b [-T=ӛ{;fU r+B,L̟@l.e>CgIS 0{aC싒d>ư0 <%PΪg=yWyQ5WWGWWX멜o7}V΅"|xygz_gi$IH?OK5n }}=( eܙ6Nn*7O8y>F431 A^v%Mcӎm{6v}]]z; ݚn\;U_ϱjՍ.}lDFٗE;y7O9cl0~J{qp'&F1? 8Y]}A +'wx8Γ86V-ոk¸ZwaqL4zwԾcx~Nù!9|4&ߒ>7t:v}l47V܅a?L]N2cБ c<Ǝ"aKqU{1nY؞XmNfFSfvq>aiY4w}{vG[\h1Ǝ1F?],0TSwNE $U91R9!ٰ0XVdT+V-wH(\Պ(Q][3^/r !e L  2D.Ačw@aPϤ0[z12IвZ.ʕ]۵!#nޡV2,9?lWX|w, `nOV'wIo3R6}aX%&KB0<|L*I77ˋgWe|rPEN [f#1.̂ ؂z}-"3Tؤz) P @L%9*Tym3 'f_C4`NӦ]h.(Z<>]5ge}4 5g))RQ cz#nNVݚ?@%6zs\W%ߙx$$wyVodƱ[~vn+d7vT@6v3("u! LeQ<4qն?l7vc7m8v=qmv5l5Zm2v(W;+=FY.#Fn Z0ڽ+w}^_NB1f}~(hDWia}6sy&S*^2bN>< j,Mj6me.{8΍VA :H k5KkfXp'F!sf\Z9u*fZ=e_O[ɳMFDsBr.Yi]-U<+)df,".EZUkX6JzjFvM@zERe$"ll[] zL Yܣ}Qv3G?x$uË^wߏOO i|NjOL,kR;fSZfe9s{3?xW;ٿxkG ii Q?ȗ b/N' ;^{]2PI=eK8' IO MAlEҜ/.0tF}=vs{Ν;c:wn[6h`;dLhLM"/ U šIF@@E8*y)u=B$F:wrѕĕY[pӘRhar7տWB(3p\A^ _%$fӴ\T?g<ꀒLavU)TziV!q5\𹙕h %Im@񢚰uۋbщq*èӲ\{d:-,(q ȲMWnAxjq9pEJ  MeMxR~ԈbJgtdGxm@1@7bIҨh@O2*ZS/\F,LӲF\kw4R0-ˤT;ВZik6/=xZQ1Sss%J( 2 :_W!Wr;C:O bk+?@YW$`f"/]o}M`jVE^@-& !2e`m!0!B vƂxa4>={GSSBs{ee^ܧ*1D4uYŃ77t"Mˌ'# Sb<:ROb ,}'S)ZChc`jD W٪!QV! Cծi@bP/ ChE>MÊTńk4FًԹ5" ,R,F$s%%=+iG l>1Xqqcmǹ Fs?EWFep6&X؍L|,l`j6kn*owsƙ qv6Зp}\VH*j_?8r>X; /ۏq;"dҜ19TMӶ=;KA XcxҳMSsYĹEQ`~FB0Y rb?rsu"2DJD9+K癀ifBLP3k#jKf4% !eZT޶-!/HA&s֒UR6 jC xg`kaˈ9癬Fg#DDL`,2ghWs^e' gY "Q 9D03ʂlUb`y ܶU"K?'Aeg&wD"2ɮ(lī^6eQWsʼ1j7Y>0tNdA*߇"TChUeVk.oA#=̃'$DpYX”%!eQbㅁ^.]͝KyM%4]"!b *+ʥʭE/XeJUI*!/ry+NY,Fl^V 4M`MLj3i˺r >V9%[1D(qJvn6[evVZf'7AtjtS0>z5jm"mݽ)prۮ f;M`-Ģ*Lҗ-jٽP Q"O>,' + CU'{!/Uy鱑S̾jezv=wm?X/6w~~mr|?O^)ʟ'? n·HQ|~R??M_L|LN]2&NSjr#<@C^DLC~|0-RR (EZi H墐e_NeR֖/2k'#S*+6ʢtBI*SMuTFqT]tH$(˳/qL1tȦ5!jiYVg Fgگj*"YFdriX0:mxE4L !K]sRhDrjvWFJwkk%|*MSD~}9t9o~kBb焨 QwdCq5Gퟱ,k'BUgR*'I=1jpx<.$iGAF4--$t1)`WęZϓybpvVv[~j41.[[P8G$6)50)ϞNV<#i9]߈pryk;!Ul2 xk?v hsyPj6ˆQ\a}AXZ~oڞ'%b/Z 2''"N`i167T=xi /~!/;߈uq|]ys ~X'ƚj jμSY&h3 7 ,/Qx:.'eMtmB y.?9;,۶ضYӒ0Ń~Spd &ю?l.-g IRP+58vr5Y&p$Ik97t8LRiud"\&xiY=%շO/ǰC l';|^KBۙpMGZ$ o;wƖ;*!?h).׊t8nBpOr9kQB3Im1L|>c$=[1b KX΍ C1+4N% kl-NJU[_F&}J2ip^3 ׋en[=?4 m^C98/HG"JR,.p.j!x\ ?Հn,^SjsxpumQ T=,0쵃4Tq8i]_YmZ-ۊ:~v7SU~jcw )LH%C~bg`hcZl1бlQ1{C`wd9I0Q,*B^P |X39`eNWƁsǟq$y)e>ضĉŬ~Q:vmy%%x~6BJ)R*G(PN"SCEJGGnk4E"AV gAS ӑm["Ա֠²h&J6wuagޣ "`EAFC5n<7N+@1 HRq |Cog+lCu*ϔ֌ s,X]=~ʲmAP)x=h&c腶UBJdgVWa}~|Lf)kǏKkfˢ3j!P١ Fݶ(r[Gv[7]{; p6SbS~|!sؗQd\ (A1 qjmm.dg5WVl;t] ;~Y[yq< ~:B6煖 dvW=5(S@IVP,9Et]φ h^3qr{ryY܆FO_͗Y];EhVM|?hmB7>k?lJKmȾzF~/@fZ ڟ G")!-Y<SK ^Eܠz5-|5mY魪0xbl0lrBDTقba)\[C{;s#u]FpxwR4@'d epݴ9M]?fwr踀ґ" y!U$R[ U:Iڶ`DZޅ[YM <^P+Hi1rN|uu4bXA^_[_.z_2`p$B$iY`0Y…PkPkAAO'#Ly^Y{(:1MNZ-R``5IP2IV+BȨ!7}VD-%;Jy{w.:<;ZcϞX8j1&!aHôʰs>/j #Hϔ$Y=Dfԧ'ibLs?ry ||wyUG9O<RJ'=zxp>\;xP!@>\ĭvIsё `^ \ 0J?(¡'N$HkY"_< Vi@,"9Dyy1p Gn鸜WR<&UJWW'⮯DG'_{ӭiMG懩QR?|y?WtT0T d&ETl@ Ahh)NG31Z$\5*h8 ¨p8`lwԭA?ة#)?s~~ׇ}^×uSIVU61(ur1|FNCOiO_{/M4qo5.QS7SׁJ JaWTuxO'rcǎa}z׻ܠi]q}o6#H?N}"d}ȦYSDp~pڦ'A_C=z8|e.!0Q8 6Ukƥo'M*ƓYo wz=`n{F ozj^vA~y iE1%!HAϗ켲NWm~|0BЧ":d۴ 13͘1  Gn&V%582>pR![LJC";x ^9F(F졔 Ñ#E f8 LV_dHKE8v]5nbvίT%s ~Dvi 5RqlnG| @Fa[i/fl屟VVX_iS?ehOh|[~^`m2d569FQ%9tͳT鈴NxOpxbZ";{{;%" {ȏӉT|q9ټs/d;NF >2ȗ_C{ Ѵ,%28NScդY.ǥA[Fs!sD'7?4 ʼ7}yUdH!(ʅQJZjЖXm jiQ^*Eolb 3rደf0A' Iz08[lu( LCv DDXD8ӡ/@GH6$0;xjl@嫾Y8oh9B v%$ 7m'@HXI rll4R R _VB@) PY:Ac/ۈVOdZկu@T1ʄi0 )Q(SӴm8cL)mŹ 6ea !Js4 KɸЦiHf6LJx3LN H8HPfi KKʌw4 z n!NhϞaoFXa z3aXv%ZhT11@F O1&-3]ϫyP4  C; p"0(r4RΨTRe!#DF3i[e4L :Z۾g]K^GѨ!E؈Qk| j5-AK"*R˃ SpsE"QpRږKhQ4H ?OY&[ <@c ix9'7:1J4!HsN@Z)PEkhn5TL'x6*mt/5=ա10q5:FRjCTo](i4&jd e[Y_ 1Eye~6ҝU7rCR 6 U#2ʶKIRFwgyS~ 9IŸHF޿~i @J7m' hjK>To( жJ[-`]qzC^w\?<͢}{,Z- *[] ׭ۆ[ ͅo+72q0b|VqH'vX絥hERRk0 5xʹL$i:j …VcgYt .![.o9׸?,չ^_*`m?6B;D.NbiPiPpqY <.ghe)^ ,+Ne{OuЬk׫} L%2/XR}AI-P]zg4Jskp]`zW7R%[hzݳ"^FJEXec&2?(|y{@-8usW=1$m. If.up=|w>6- @;/rĦL!|̍+8p_$]]2ru5)t:$(RcV㖸zy5L^_yv^sz v=T$ K#&o&0 v^r1)NI9$)M!RF.r¤\^H?Cpg%+Қ!^^e xt}=Mm‘, u#O8~li͍cǖ  G+˳kn5Mi=Ƕo2LCZaҌZ0SMqh6rqo}Y=y]wn[S tuJ.dR ﯂a(x0]]Mktl0VӶ:ƨX2#lQD|~Bl wOqW$߀[۷-͏ܶ ǎOy׉ ڭbi<^*Zm N w"e)̋{tBV~ZY>kYF 8xB'.nGoXV܌۝v'Y I]Iav}L6-C#xn~JjX34fnO5@.0DNE&u!IF4;]DTEK B)2"\& %rcq]Oe fs:A$x\NPLh:Nz[VU+ê6n=;ˬuz2?;,z}SG`ƭͶAE7U! AU okwGc?6nomA^ b~|MȕUyi.5p_v`oyѼ?-_yau?om<b#Tv~Jp^D#ɐ_ay3~Y~%pƪX)x'Oukq> _z_=,dzzii{TF9*Z-7/jŁ\՝^B=x .4ɀPV(2-e9-TH %tt'L?n Aj^^=oXBr2p<#ޱg5I08vbСUkNu[}ǏrϜi뱻mY!3MlX ?ZM Jٶ0V$geE6ViUfxՆA6,߯"lu4rlh}iy]L3oo `!GDoul򲸝puUvbY֓é(ϓ{ 4J]&C'H\tyѕeMg41LO”u̟zJiZJŠTxV\ hך&05\';bS0R-6zpMWk4[a-3Čv'ڢ6gȃ6XI*l^yYQŋiY} eGsSC5n7as2g/^gxbM #e1Mq_*,GI\#]® a1Fq2Hc9zFߡz0a͒?ͲlfXM'^I˔O>t{=LTCNp v}`sڨ~^y>%Ѕ,ϼA!hr*[#RsЦGB+!U~[}9 iBT'{ ?)A:X$&9${9On'$g-fI5cvRT<Lnϟkw?Lf?}⿮zwDk_^{˭kUDyD˷0!a;=(t .ҍa^We?eI4M'3Z_k۔ҴBVL?nO^,˹v{q gN2N L C gAc4MƔC"Ӹ $5r%9O|;hB8#4qI digHx6?/TV'+sȄ-D1ˁLd)tIyM쑝D!E*KaJ!Uac y-Ny Eah"Mߊg|.9Gzݑ9Zʑ 4!\7sWnKS!x TU ;,2R ݏ# cm0`219RRDdJHf ڦ%82"H@G#Ҿ_5Z-ADN\mOj݈9`R.0R6Kp!,āz=4rC)cY^m`(`:cFR*@jcۮ5vlJY08GAJ6&3eYrU2 H\/% ihfTXU̕Wr<(r2qsxNMS,4H"LdcD+dn1/ԏhNGƭ$Q*IZ+Y[[ l,o-EPaUJׯ[ ݆i[n7B¨#a; X# w^8\mD!7+kYTQͧR[Erq>G~@ )ʣ 7OgE^<Hq͉%L~R/_ƚ纆aܿ6R2W8IaiFZ$R9Mp]w-n7ř:ښ6^#\^#7ث.řnh6%/X[[I$4 ut׮Z=U'z;MTmw.%B38ێ f#1q^H'dܨhɇӳRLvYyv3qqmZ9,j6ˋiLAf ~|2;w.q=ێp…WoV3 vhOg||D8?ZRøwaekDQ֚I? °*l`6@o:F;VvˆjIOg8ӛDŪ=9O /XW, uXI'>2ΠfVyۥ"iB "{7e"o>ðщ۩, ةE1N|w]QQ\t1Fa3(8cGk㱜\[K;XO1gY5'{XIJLˈ8FB4]eɏ(6*fm~/3K+2{,e9diR{KE[aI-Ѧt1YH#9'cI&X{9GkB"H XBP*%3)?!2T̂ҋ6@ H(i8px"ZA$`NH` @4rcN1vS zNr~UefM(no#qJHOdiz=~ /ilRH'<ɔ=~/J_Ľ>ӟ>h4~>mzd #!1|QN⛷YKw1ՄE` (JI,73xҹtiJ"~ /y$H@.-r FQ1MlF4;X괵vAZ;[bX'ZAd6 )پAzV]S^kRdLr8Nd&aZi2MMk7G欑.fIPKQ=^Io)M#@EqJ~]u|7]W'0RF:J0hdqt wa8\seEԴ,+iDk?As˲4E+ANRI|=Qr|RH_͔Y&wҴŊ y 5*Vr6e!FqT`.:&O%"}4yRC͍$we*@08u:$!mض}Q r82H`5a 2C 1 ) #s7I hf6uk Vx&"F+-HDW/ʇ.[)#"/$I*aTJ(\>8"yE{,_#@s3 0L B䞌 V?!Ų*ljs"z촔.^7F*'Qlgå++}e<=[ije($|2i3f*:BR[+]AGVxֶj5Rl5;ZMxouնʴxbpz굼Xv:[晱 wuUVCqq4ڪ*[gsc(Ch܌ٙM$@Sp\EhPe^e>/qR-_:og39R-~Kd/Kڶ0 a8۰l CrTo((g޲-ۆZp- ,yj-;͢(mGwwoZEZJ)\"-Lry!0Is](IȐ*\JR!5Htb9[Lg^ihZPUW'hq TsL6k50'nl nlmn' [ U >cppnl~3 4M)O?6 M%ĥ%qjkB()R> p` ̣P !Ѵ/e%=0et@s(S2t>ibvi b%3WS˅?ˡt|Q2 !v]c .E5Þ66VwT4TEՋ|SQ}VOa5wc|[BʪPaM0-YY=3ZRȰ(&|n׹Z\GC \-+ɀc_Jg}x]#EQ{_,O s~o_Ν;A ;J IN=z|HLq\U.&"M@ܔ)R,^1+u S)ӆ^Z۱;;;0 d{Zw}e{8?d.JeZܞOJIUM{ɣEfU%.mPaVb^l6IytieŮ"ক4Ÿէqe"i8FɉJJ5iNrnL<4 BP0&mL鯼fJ`Y*Xd;<5oG WZ&*j])Ŕ+ЖHը2 @KH)6MRژ(m(͜fPMKvGI9Gj )aRJ›H5@ΩR1\!)(2SHWY*dC˶QrX<` `Jf93E͇ H'NnE̵%9qnjsCx0AcTp@d `h)% _mv pUȄ)6@QRP渌J))QG(Vp]<"4_g1~NQ $ݕՕn !bdH (y9)y?ɟ2}_'sDk2e̋" dZʛaҴۂD "y|w"]-Rgi!"E")2+@4BN!d~FGDr7cOdcccsgI/ʅ;vo{Z uWMY"ɝesm 6~h~ۚ,Ae݄@.Ii&b0 JfEZj6dД-p[v-Q,~jeY]9'< .`Üsʵπs-9e*BBg30 vBPAhHa" (L 0??oLrS`??ڤ!G}m"Ѝc=R&F ^>׹B{kJu`RʀQ;@PmgM=c-@QO!AF.i9U*]E /#"o grZ"hr|?B o(סH'h.1bk%NV΋=V ?.]isAJZy9]ʦYRh|O{ŹGfG [ ~`oY&j6`\a@ּ)%]`k×W2뢌"ֿ>}8m9j ۥK}5cJ)S*ܚf=_uW&~Բ}ϛz DhR"TEZRGJ"fD3WSs NJYc]ae08iC5Ȯ}nbHaitl>$1;k#evt:EzmenO-gõjta(P(o{yE~uDֹx 0t$Ju CꗝJ$Lp6pDo7jcYab`ne m505(ll6 e5o`3X`O N8炡W7J!-36Du,,L2-&ne/§2y4Cˏ.jpgŴ{~Ҿ$5I<-۩Q :qD5M$*76&7ď_RXO> b2+b`ڇZMLLϰwDcpȳO_†h$MC#Jbq%Ľ_He0ŭc2rG2 4fdT\!W^1NXgJ{!J oX MR݀.Ll0Gqa4q-:.#_qt`YFM6}}nrnid0 ]3LV8Sk}ڑm@P#UDi2εN8r]  Cw'EzYJC0-O޴ԝw}۟[/]ta[o7`e=q |\ ȇȯ/'Bo`CrX dEaiڦf\Rqd["'T+T6. ^Ŵ4粒bx\ړ;04o*cd׭XFT'P+YYIH$A*iYɲ(-gK wrklVӼ(A,3SƀVdRc*qt:ERGt0+s` `?2OS܂Ӎ 4Y4.\p݅ĵ^{R! a/cB+5}1DÇ_<+++gHJi+;;~1c GP٦Ͳ(ǫB Ûo2A{pLv7RJۨnjYkW]uU7 G=777u^y= |Ѳ,˼馛n8ny9%/=b!љk$9z;<ϯe}}`CරnKJ pDždwwwT>{H>r- !Hƒ p$dkJL9{K ymt'-6-38''w\EB,τ[lafyi{hAmlnP O4+\ڲr: n.EyQM dz^ԩ 718Q&7|Df=tUYۻ鍍Ƒɴ1KA3݈{C9}ȷȟ%D~l X1TpNUp3Lf* .dizFVL3,~T@nެJJlA˨IS͒D(uPӲ*}zG;/Y>x7Ml.&9^gu^.fnu~1t:X4nau`0 ~߿װ4Ӄ`p:MӁ٣/6_1x aj?Q|Iɲ@kwܗiMi5MӜ_W;?/?5l~4p0 rq e۶a30c=|Ŷm ð$Z\g|)~qs)4')T ,M)EC!_G>WtM7O}y/L$POf !Mq\fdY e]Pn6 #*ǣbeH CH[T; <[hI -L%|kڝMBE4p&՘:{/%j ^, JQtygw]qIƄ(vgVQ4mM M .MykiQ|zyüǖ\i rVkʆ&XVj}%}oQK+YK4Nh UkkB 9O[dN^oϼ/߅S.8vS+O AJԃJ:hT] 4mRoPgI>f6k3|#RRMi A+Cq`Ft4N3݈Nltica SCCi%n }r\4O>9,%xtE,R* 7as:Ĉ_z:ENj*F^ *'oL~ q:&΍`mر5>Jh I6OGA a]s5 )wwvn 4:D>F>K~@C Va=I{O⍄2/2/f@r6`vE-E:/'g5sBypf~mK(I:KXѸbЗBwQRΊbA!orz&¬xe2<|ȁ4#BDReFbpv l[ /`m3 ɥTJ0LC)E)ڱ\))Q.BB(!ķϐYBF,K*%4D &PMmmvn[@L/ZSzm'ߛ$~7USvf%\SrWZͶk﷢>K%k`l<0G?ф<#E.9$IֹWj1a z?c,E硋}e~+Th/z5:dǴϭ` ڽhn!b7v.\I:h}UJAPQy E5 ^ 7;knn0a58eXT4$ a֒V V3}'p)Fv 4{7nspKIm˴A7ډZ)VxT1l2RovOf@q̂r\CxAN~[q_?8c4o7οOj?qđ(82 t~~A/*an uK^Kht0ȇI̧:ډ.F҇Ч vF`zL;E<(B l o1v+3TchؾVf'uVhǻ0/ܶ#*JM.i`]&K&u0p}_Vk<^Y hԋql"77۶qxn"&HnGk6u7͊Ÿ)&ƙ3Ӿ9<`ccc;0ܴ3gq3Ӟ98?ꫯ77-oY[*$_oC"kؽ*?}m&;uԩ8䕃h o}>A|5[?uԩvE>pϽpH+:%?,spmGG4p/93bz-6DeFR0 I6$Mx`.ыF0/0rf8ݲkeK}efޜE#hQjԀgH*+AyE++Zh„?E$ʲJ CVPo9bgi3|o& Saқ&zzz,Œ}歌8v ^B@|H'E\xϦNi|eTJ6vbpw"qYMC-Kpuj1<ŰTMug*܉XʃX$ɮEEDy/yfay> 81G f-1&SʨB[v yayՏ9 0,?cVwu-;9Ic%y+cºqq\ ]VN:u Q(Tf|H=k<8GGφx8Y7qޱx@jZܖe" t ёޚ'DмTƎn,F5Wy{x=n=?4x2qtvk?Z_]bOvϷZCX~%yqy|SOx'd䵝&i/M)WIzy^4Ll $zY^Leh^佴a[b%Y/%y0è4k!xh4C&nr7l GFSAn`;.)"B~k;ve =ु.*Ę.NmY[7"ul3 3FePeE;t W4M*VV.j1ul^ al%"XP9(QS#L&: Qly-C'1t]rvj&\ϛ=afk<>Bs_Y㳌IAO IdqԸ$z`H Lb[zpTqu' &L‘IY+Yj[[Rov^` w.־si4D;Z0 =&uKx=r#"si&0 p4+V ?_FT?^wۼouz&1<.V}?iE}պ» ˲*0;Fа*g`xQX.v:a+cduQ4޴p#-(j 4;"daa}}aX|8&4u]wQe,F$~lDZ,/4bX p re3K4qeW0Z͒p0Uq(eWPUEښ=GU4I(ڻx xW4EД>&ty ,k 3ZQ2E thf1,&# < ]vώWen&t'Nҹ U`Vf~Z.s33[NbF)&Q" Na`CNZ}M0R;AW|ޅ,4.@AȜ]tmd[ 7i(M1~^>RZ$k׹g\s6Y\\^vݥ33~VVkYq׫ e9#F׎n\sݱt{+#VT$v xh >ӬJILcgDeV<\/_ ַ o{k}}Jɥy{oT?O䜎3c==>Ic R Z.ԋ}(PhnN'uvϷ Lq[u5b:EGI\*~nm u BZLWOoJiݧt,S*( q}i6Fo=E1L$BQx_-EW Ac0TMU*@_ ^K/%{`vJ×X4!%1%HO+ǩjuYk\QU^Y㥵?vvKCk!- tGt!8[w]l=z^(&8PŚS9`|diҍ1E!|ȣp4T}vۇele4Νٖe6պŁ- _;V'n P}ǴNn# ,Ȧ +<|QTCv+IϥtAa`f Bۙʤ7_#t:(yBv+4фSRe2lO~`P08Q`Y.X=۩G}Fv4~Zv3Ms6u oЧ5q*{>QfqB2ɏqYV=J($IU Eg,+h=d,B&Izr^IV6/Mⰳ]S8'ݩw8ai,IoOvMw7w'淾o}/>{ҙM3[/鎬T3-sNs=c\E/x /g泧9>sfh G8=r0#v6HM[Miʸ`/.JeZOgth19k'NFahYn}:Ƀa<XQfCz{}eNV@ӟ esc7Hv!>ۓq ɯ/'f;|'s]Qf #ɔ9t͹: %ƗQhNQzh~$Ngu.|C7w>>ǢB]DS.Iδ`uFM,OkAszѠǑ@0Br]ϲ%zj&8MCqY\W+]W鉪#&;A%!b` a0{umeyvnuD'2RFԨ6{>a7ǖ)!P!vQQ랭5z )VKZc4jUI=DnYF)).}똦i:wZ++Wc 59^H1ꍽEx:g7VVV^޿}(FQ!VW(ֳm_)T0*"c:䴌]L}o(b_V=̲aƦ7^۞뇐$~W s#Ye,ZpOcS~ !I;RV` xbmp&?K{{XMo;c\_?ce'E3@A݀cultΘ ute;^\ŝ?MCG(/{H#[V>в94@} WBy|.#dM3!k6q2U:QZfgU^s;H巣~Ρk9Cq4>&h);qm&6g)}skQm9|qrEngDP9IC5ArxOi>.oyP[Ŭ r:Qeh'> 3&er d$ & L)0KYzr;z.vrpp'圁v)&k u$58KH) Q ׅ{\(m |2-1qdz|?V__r3jzutӅŧ֜BGĬ,ҴXis.䜦BQ-nYY`LŢAYꌸUjq3G\q ;'ٙ)]>BQGBtk{P*t*XPP0c7ˏLg]![oE57k )RFr&rD-FT \޿hklYop4X3;OgW2FslVAl?b_(_$LtP9*U;wZDiO8.56FRR@10 9c3+-n6:Q$$DZKH D`ꃠRTKˍ8Z$E<3(ZqؖFd"#ÌN"t΋Rk#BQ| \^,5aFM "N_ZTD yhdZlqeah=gPD"0lx=z@|董  յݼ@[V,3+yѾY)#7y|euwBEmqy36[Jm=VaS14EFtQA_<2t:dza 7|ѳ777ILqRx֩S:'UUVurMht柿뮻q :4Mѻgч/FkDw: ȿR" Aˑ\\7 |AM.$(LqQgt&g1@&ALgsKM4S}Yk6Chʺj@͗k+|ޒcJÆ, UtE(eѱz6tā"_|i RNsO7Jj^ @9TJi;Ԗ)iERz 9&hBH\(!JXi{z ڠ*ː2$!5 `kxm1+za[Ҵ-~f[l 4+LV7 40R$uYw:QwN:J(j+L_\(Qʅ(U4A.(4m!}DGI- mfk;sl;77 %SrS|Aoll +^ Q݇Cne>?15`e7u D(`V櫲"I)˪Ze@ $i`7*JٶM]qeU 6Zz˙sqE< 83d;߯,7\$K=C޽OD+բ_4zچ%9Q<9.'Ig UZ}8KՉe!%"s~DL# ]ge7^LCy`dʉ[rjuLf!,aSQY`~2Ѿ 6Q'*i~u7ijRwb{pɐRfꕀ/shP!/FC#hC]Scj1Sk )dِ* lm̴mv:6p2ϩJk R(qi9b XeRh< FhM@l˲s@Fe62 `m P !Bu?I;qy5y~gR>|#t 9Vآu~-TA ޫ*Jrf#~^*BFe,%ܸTPc_‡B?&7U6e5|&B, M#nt5/@3@c 4!ڪ<[%`,ԅiͩ7i84  _x g])6G*mǶya6˖m9ݞ`J4MsaSTzw5T}A ߁l;&f*Fii{e \ ړi u{N&0A}< $ ^8J$sQRuYqiiy%MwC##WwUxZ|sھky[]o4`4Y Ve%+YMTЖeu&:nj}*9j/dQ_kUUVBʾ[d%dHevVvPɒoMwh;s(n\ʢۊe%ċ 3YZVeÐvy߭&ZE1:!pU ֌ClIZԾ5^`6B%SJGcK]\pvӲh8gU(؆>KRh1G+a"YՔVEla GxZD|19@pVE d- _Ϲ [wP=uðlmQ>oQj9|py/ᕾ_>G2XK(-\kp}5s C0Lҕ%.uuqg֞;^й͟:F)"qx&א$]*fhMN4,mXb)Md,C4aMҤJ{+]2M_= tq &.j\Uch*>с )Fq$0H] J]*e9( 1 WARf#.t-weв6* n=ějܚ8J;3qW}JaDQ}nQ4`bTsdts6BJO"0f(TX-zŤMS[ԯ,/N:qsJŏ}G5Wml`p-A*5ќ2mARq!ôs-5O3[B!c(/9 9DŔ)8"P"GfQM!%c# ΍D3x"v31B(#˚€Q7|$d!Wd'#)4 "®`Wt$v$MRw'bΪ;6Yz7 5ԃW,*bt:{ۘD+qW%+R)z\p ,L1iy}FQjcN_SnJ=n=IT$q3nڂ^,pElyeXfRf4ˋlLgGAXj&Inc<.Kk3`sYOiبUwUٔˮ^=B(hyG\j@Omo9dctsK>H}ɖG_AY]p-ݨ^(j6=?7]QmZJF[neUsuV3WJ, [ϗ#GL0:r+vv}7ǽz/2tD6ȕ' . ]Z3 B ) P@7 ~!sDkQ8~j6QaJiR^7Rqci i+z2f֦2[cJRwڿX{}UTs7\IXLE䕙"?? n/  M?~7zDv:|]gµfX>f 3u>~: -/Vi.zdQ-tz~ݶ(FiV-wb|Q̲i-?Zij(ME,\Ac1vP!u}5+uhj2kRqiKKK./t@% @% F0}~xm-\cƴl8OZK&Au{ݠt:c)=Mm4v oǑK.SZ'{znu$E|%$'cqs: Ba+nXOf0rX ME:-zlʮ9Arm(…"{U(rrgQGEΨ OP&+֯1 G&&mD6GiRk9&K#GnR k(zj1#%P\* CC϶X?BI TB-\qhbR:Zm`Jy' "4M0^=h)H!Ӗ.7zBe`z\Äz6ܧI@J$AaW ;ӄ֒cFLH\a[Dq?Zx5eB6=Mt`?Þ+_&鷫nsssvvacnb^> Y9QtT#ρBZZ-N~iZpZZs]pE'ך%"HrY\/^a0tQ& 5y68Xx\q"SW'YZ*+X \hd>.Džr[L'S~8[+Z(e c%'\x_rV-"bVB$ \Tl=%A̋[\{D=7 (tyqdEcVX_4.~!E@K'G 2G[ <-4S`K.ޜ$[QrZiR2=``p#Z鹦/8L[_0vCiapf3DZK궜$z-79l!6 M[rDHvF˭Vq߲J1Jڦ2ti3J8j12Pʨ1#@N=@h'˙/UN\y 3\3.8":qfHk(T)c2}n\VĔS{B6A2X:euRihEiF+K]Գ,@7 -^)Ý4kZ؊qP |47 bTsM ̰%ްJ{/󵎷2R2gLL0 pyz_QP>Q(h;4~ @ƱD RKVj"& ŚIl69riY(2긞IlCT% B0(R*ʶ t8ພwvxdT%e(3SڤQ] \y(k֧Om`)r.@m%:mFVIr3yy)Tu4I}C85)kzCu\R'~f37ej.g+ԋcofEqplNچ:x?b@0fiC6 öIB{Mg`Y=Y!NؐN.p͹^BW,EOq/N0K?Ng:Eq%+9|q1ⱈ/ye*ylq>/3x[ַϿ}ޫ^z/٣|p N yy'}H4;;ĵk%`^dC4#Uh ]o?OVE|dW lm=E7ܰ4!`,;cgÇ߯i2ݮi,ֲP7tk秅OO#J4B{<I84q|e8DSY^ju%SFl^7vZn-,mp`sssFxmu!A45&ϟ?ZZ^//9mEW= eimp~tc=@{VlZIJ[:c<4məνV(ykqFu :dxL]8̦g.3:81(i>"iGl.m0 ^#H,Zfw8%ɹ8;6YַAlqlcx [eyzŽ]Mf$:V+wkƘn'So2FSQyXzڋ1K SpXt1XXyyV367a}펏}El .E/qIןLo?z :_gy~\<İRmA1_\ȋlKA?3z)I#pZ,ZwlPl!|V%ݧpޝ煰a齰qFO̞HPF$Qnk"Raib0htFӲ0hBNBm94: ~pD01<(H)a 7,['`Y,-aCwGQiml ^knRhI j7k% G5,Du5őJD j.4Ep*A7MQ)06 $ A0 D.8z_ϘPMB i"6Xq F;ٯm2p8lDHڮep+ dv v]?ul=.(VDYI<`W Rn=7I$2EIbťxHLR#m2ŕT'[|1(ꕉ.I{ 9-oBY> I2|Ըѻ޸* I: wBvW eɐ*2 Jgy S9xeűSxAx+\חρeCrETr9eJevDФP&NcJI9wvsԩgܹsCZ_`#?b}O m׈-8~lJʎBcmur\xuSyAA{ W5 ㋗m?sbqm5/^xq"/6/^l\|3WŋF}.[}{R\~I8JNtR>;tF+m@vrxxTo)./-oyKFt,2VV ؎syjSd|?iiw]BFC.Eғ )ܾn$>2ˆ:~ 5zb~NcI"xaJx!4Wȿ&@8CQ8MI<8nl i '8*2Yk8YY&L4$iTq)M2)qR&q2>^nj6(H܆EUg墜lZj<̫r\͆(S|6W:{Fg94LYx"l>|<ǹ<W~Wپ`k°_>fN#;I{Ft1_X0<$ c /L}27y252E)gL)֢5oW\>o!O9C'˭Qpr̺D%`wԍPhE MA龼2T !M@`h¾M@g*:&fP.5gGBf1̳7S~/|zX4z7eYo! ]z?=,"wa6 }~7{ncҶ% --2?"52:uO,uEōpMgZ̤p0v~G b۵-[cXL$1"e/5z/Ŧp}2nՖJ  tzvy׆6(twޥtƦ"JW,|ȥH{E%@tn~(1X+\#,Q;U:2Ygfr4Bₛwiyl0li(E~$E𹡵 NX5S鑼v c{0ή7Cj09zi_}hWL<|L 1c|Yn9c虪ߡ1,7^lyc=2^-Mmnh:}^/sϞ}d`/;ZdEqt I7nO)x;\"٩C5нU奈]dL p^I۶V>[#n?2#a~\Nʣյ!8#pVz}t1 Ϸ< }(Q6[$dL^Dj`F}mge+^4H#0㐎= kLԏ"iȓ!0ӿ èSt5i;&Hƺ.@MNY??,߈?߶0Iwm̶Yjn~wK[erFZhq[V |$4$5 i*0.Épl./M}0lHZE^Kn){M!ɶj5+Q{! Z ez4G}F­$ ,.)h; /Bekjiht:n{Q(`DQSJao€Ji=OTmn'ElBGrzy$˪tM @JID41`3HJcc LBD\\en;Ubc>dx.!+-x$v$ 3m?݆."-&_jdƣRi*NzB hwnoը,^6!E/m2 fw_nRTKM7yHs&RײRBRj*KT:0RXVhۜqJ] ڥ, 84Lm;ز&>⢹ڣ(EJWHtTU,U>њ8 9y3RI XZ̚Y2 iQ L 9֮ 1=,OOK(6yQD @MyH@RL`TEIβњOQlr*i,([rT]1NKeȕf߿&*/m^^R~u/qQ[nc&EAB22f;8fDe /Јrfk25urRJI4/ l WQBE!Ak(:0`KiΓF ST>5h9 bs""Oyvx$U9@$ gY B2߰*:P YS$hc Ǣ_>3ܷ! # c@KX1%i|x (Bcbjk8u] v 79 B9:CޥKl45 &M>ţ(v<-0#H%:^7N=^rMHL̕R7i&PƢ;ڹA8$+pF9ڬ<Żmfn'ON Tna,[5 </G(/\:1ݶv+tt2@^АEw@qQWS]q]~9cMEtp2Y/"|y64Y1Z )"И3< v^=q-=I * Qv 0J„B,WYR;X'E+R*73W`}X vm^M?z1b9N' AE=$ݸm Dp=,Jk%GoNTfޘ' &qC;KDUBcoDi%-38Gdi!ϑi`$`;  "-H ЫsW+wR,&Z"$,AxN8L>-o, kއ n"-ctp/Ìyxw}&Uқ{o=|4v}:uђwkM#c][h2Lt#>~e-qйve{zSN2 ZWKVÒV9Jl!-jȴln~Sb4, o \EiJ7J%Jsֆ>ʗҠUTUw=bj@0&0I1G4߲}`-RQĬ9R͊AQQOQE>tY /]NZjB7##2D)6(htϳ0PT J!i4/0Xy|#1B0-H,3G## !.tWpbpQ$DrvfL34tPni;n(ܽMu4ݴ6Tz9!g6m8 }];,0h7~m* Z۝M[~HCi<`o@MQ̇qMIG GG%-J>^[Nv4vuqtxTu.Bt7~x0. {o}yODFh roS|C89vv9 //]/i%*44Ш*r{4.`q{#?.ڕU{i,vya ( #ԏk9n 8Ap|ĊH+h^`xwg;x_zvpl= wqi3l7/x b@s mkɂyzRYIϳ.5r~vvyXS,*|~*['}ZUZ39xe ו yeUA"4a3ԬGIFyxB>?y!0SG-+?X|??ozBr[ /OxUV*x+ lIlx-"`%Ĺk-8bDJ_hfHfUY=%7r5qQWjͷnma(&*J B&-8IHyGJV>&">DRY4)LФ1 J)}g=b  drlDXH* c+1"P ᣕ 0zCU'1kXDM F#(-}DBuR8r,I)h6J9Bˬ,DQE$BtޣWey{Jwʺ0 &lx\ACQ%8W 8>>:.I7`y9)QYp1HHne [n]y1[ Y 2(# o :*AU_WL4GE? »&]._qjo>>8.ј[)ۋ[S6k7a?M0y] @`QՏ#ŵ1v-6kO(ۜϪw@'7gu{Nb^rWGh=2]ў_sɕ&i^g;Iڷq3~~D('͝3 7[ܷ_s i&ϋ^0A 7EW9ri+,>>8;;ߏWbo x'/܅|hc:\`t`.6DE;iqiv!i.Zn!xӮKכE;T8ٴE5b^Ҧ]J_vVn)bGI%I%n]1o3߲]TmBC [mږ&FK]ԭG 7;n][-'RO< Ro/?*|awS .?W&> y_7_.N~G^zu/?-uvp񁽺n ިuCիOO˟\~3<o̻G/..͕ɝg}ɗEQ (+W\'xbP{hSUQg%0LuLMa:on H7s8(hjv2`Ev򗽨s0b66mRp8ĨÜ/sJ_CY&F 8g\7j1n'^믿drƮgz '˦M$)@mfN4["^^6Ra=~kH$= 큁SІs!Cjag1;/"nb$(ȶ 굗\s5ZfuZC7j F)v{DÄ͖벮e*_F\ _u_˞$I& @+ {@+;;oAܼ=LvɕVrepڽ*J~PjDAP:c_ͪQ3gOAO_8΀,]ļ4 N`Ȅ D۱.HM)>^yy-wI=)B:Դ-߲`8\,C,߲M 8kkch;\Vs@!D tyi aĴpo} g5/ i!uڝ0ꌹH]Κi5n1cF3JgEW~>꫸" R,)\i 1 f-Q k2s{Z|qCs;sOl*m{[A-{q)"`$Kt8.y']*?;~W8یQ^}=wl_JUm/=waXY)G嬜Oc??;po?zk]m1mh.8qi"(v.p0 ~ajmf> rE~2C>=bh>{|.sݸgoZ/8zS%oZ?ePzS륓,8'"Ć92&I< Wy3ٯNܪ||WFWUE$?|qO~O+O|~pXW{Kț-Ŵ/Ѽ$Bô;sw8j$Vl>hAG4L/K,Kc@rVJnu :.t{{X/uüumٹ⊝CZUaLi1+?#TI<#,i4zEdW////tm OAw\vOp=ݐC@nڶXw={iRԽ{pvdC {®uqP$[{;۱DV0MתcƑ/_qrQDCzܚxZmZA{NSxT~Fߩ⢚PNx>粜<^Ti9%}Eɬ  83ә~sQ̩sZZ4c^g)@X8 \4g^~vqhʓ+SN9c;&$ :u)1"ѻ8o74 _{wygR_ f[csxNiPOt:V jZiiiJ1j$6|8L{r)zIk<]3/P70ušZ̕$m?=~ qTϜ_f-R }L nGo7%`2&Zk֚nRMЏ"uIQ>hҴ DKc-@F6?`:|4gheF,ZRfA0_P^fVL28p#B RvoaR oBKd@E\"{1Ǫ:HQϗĵQU>@> ݐzogdqȤdizi2Tl_2鐊 `q* ,6bi_n,kFs; ]`m|8z>CV@1t9kemw.=|{1ʻ]?Ӵ^~Gޡ [[[[o t{]vgy%-¶e ۄB|. ZTEgl\lE)`RŘ6qJ*7L+{)p'$ؙL%H"u3 U &Pع+W/,g/ 5B 'РeP+p@k46*'{41* 6^nlGk{w窫v8 4F UWJKagl^׸'5֠жPCHǡ0A㼆h]-ayѽ[mqHe]?M*j+VZ ӌ4ߵ"X%^'yC?AíBBTړ*mIxq9(Ehѻ,A9(,v|zQjP*J\>pg~?<)~測VG I׻$ yq WH@ip="X|ݧ+ivȋ\_LjQϊcf8&`aP^Ūt$+վà":Ӛ3U@}ߍC7v4ײleؖPiεQ4[ĭv4Z'(iFBL+~ljG;ee8j ]sԭ(Oa9 h-M&,>ϰ_>=t*4 ' ;Mh6`zmX-xm퇎~Di XN1h'(,\@RM Gе- F^嬌册)4v̔9ZjOK ~)ԲMGT&'TQK=CoF4ij0V!y!e+g[H1(QE/Ezɝˌ%IJ)cQܢxľZ!JF9ļp[Ae7)p8&\'.y+(BI"H) q) 1~'y O1fpWo8ڝ'RzkmĦ9W]s)[,LxeqJi:yǛ&Ќ6?ҁPQE ϳ )Njl/:`wWCMFdP"*P6b8uR|H( Zp_X~sa:hIAgdo ?KQ~sRL))߾:u?4LCkq%_G+:=Зk*!rA*t\I+#%dvtӼ-b#ic1rRS/Q 2>%,;]0l>x/DϸZfdC ^g<#l 7ٞMci#Öd@ 0nxn`m'ˎ7l~ML\)%;]ٮպ5 4o]]'-s   fs\i0 WI:NeHɭ-C%\fcyW緶byocY)M/+W# AQN_L'.S,i>LfZS0Gq!&Gc<E4BƢg1rUJSƴ\PB)*XN[+:h-R3%k5̴d^@iL+K<!t2fVHxJnFm8!<(~BH["drY[5p/r|[Cݪ(tJ o샽˗//2 j,Q-M80fq@)0 7G[ )HX:aRiB6VTp3|ms:x2/aJAiaęL(QZѥNą!BhCp. V>9XTU 8Q1HL/U.ϚiO%7lz;0c6n}y0cZܷ f7)46F}[JluU~䰕~sY""o$$qlW<%Iafw .zFn-9ږg $\LktGh9p\m}]f|5j0 =tR IkJD>NQ˓V2VrhZ&t)cǟ(=vi3 Նa86{3t ckl8J ̎uZ-_HE5b͍4卍"ϴ֖5{{+9@?Ig+AH1D6(#ߏOvmϵJezS)m4\@fw<!>i`۟^D( 8a,%C| a6k9[t3kd <#v_{cs̖Zm0VY[\鸦a19rTFt;|&֎O #r]ȤB'FHHxG'-$)R(*RFrcǶOG9㛽1eܓ>uudzɭkA6= =!!˄"-0 ~ e5] .؏Xps4םp8Vwn#7~]&ـEa^y~],||u)EЪ6ԪE.Ɛ/ev+7u Mv?qꦛ0~Bhm[Bȕ{_/BaoD,ж R$H$FDYք89煸wq>ˈ#BHBTs~gC!!B\$ sry:! dͩf2.udߖSqWM ~Po43g囹8to>޸_2:"!FÓ^I'N=ƽ^Ob l(XOtTAJIJ)!~8IqG\BFm}.CO{8h;cq\>^Gț2-OHNun=ofNMClyEwM^| +5.~-G(RѦ -t@k,DlPXa33&mӤ\ T;,tlӤ w2 t=Qfץd( @LJp38,3RO mJPV̵o!J hQbOUjU8VBFv,`BIV|=DC 2pDM丢BwO/ #[;` !o~5c+<$̩a,Sxs(wn%2ѭ[+_83>_Z}mIeVZn1pT4-S`a,xW<-nxֽu&,ZSӈ3ɏ7'ϑ5((C&i^J&i{#&9o-0C x>.q A1/N0 {% mp8Y*62 Ch_n S!.;-n,^'O==XOBl4OSONRh4'pXIv,Ts\藀bP՘nqmйr1DrzTʡ!mBꨙAT|,nQ?]{a8\Z-C]y%0\)Li01`LWTUUAT7u@jǁ4]t:80GZ1S@n+{*!8f$K;3>K҄enTҋBO?/]1 瓇VV] N *%b1 a8s  \wXlnټ9¾)Ct>g߼5^w7z-`"1o+еeYVkm\KDt$ KNr!W~+yy<(yC /a 䋄*+_F#/;`@=NOq9#Û<|ӟ=ϧ⍡?È>%̳lć~_E ~w'(JC"7QGp>o.|/|Jٶmi/ :/ u{QeXic:N!"?` c;ДzVE-ìA*vm+&W" ~SKΙT "cFl2dAD1ؖ 9<љõip'!jAN&-b k 9';sXlF?ag@ CNN:  jY/(23Cn25 7ܐ&~Ɖ ymU+Qa(в\[) xKA CU)w@JݼHhkC%M]5 ɾ %?9W?(G |%nayTHҵ:F+vcp2)'JKI,xY^TFuc-m)ؔHVFFG(D*8Rm~Qv,g777+VD /^u(狅(뎆b54tVK9\D%t8f)2chljƦR54ZJG%=^<ϫ=wgNsgX,DL|7gٍ͢B6P [Zzi:5SB8Q8^1yYpH-CzN'xfiy98=ki,"d9+6a^8 5h 0#ƃ>RPrs G(^wɓ'Fu}73T[/ gP@G~?ޣfpZ 1^n,#WٷΑ餃Y2 g#iD-̍Ae@߆ -,2%TE DʡjQ:)QM<:J[٨L#)J^JH(2aLtM{'6<*7:QCXyž pP'suRWe ^[Tz\>.'XeR+lTBZ)1kb`X?hdY }@su׃& m'`b[z`؝Rrv!tA(;T h .l@їVC\1ƖmYQ5YVz`w?[u P/$9{>\$?E>4=x[e) LSxKXJi9;/ݻ.{Gkփ&IdbBbs|'G6*hjqP43Ҟ5RRi_K1S;s2^MvlYpiBH1F`u'Cd_5Q0Rܿ_J6 ð)]G 0(R,TB 1G]-"zeŵ̤+f Nvi< Hh]@#mui`"x12ț jNDa aa'r7AhnPo65g,xG p[lO☢iiq:Z] J= `0_^]͋v256Flv|i6[wik|c8Ƌry yyy@Aqx6rhcpR_2.LD bg"ʶ#@ul0mÊ0SRI) {sHEFR3 I1*YU\ CUl\ZTVV]#(f=EnW ,8.pYVLJKYT(ՓR\)4-Fv0DiCB͆( "`Qw( "`^" [PuU[rOae z 5T]t/k] Ft8ckI*Q6b"m)G(ۥp%1SʂqB8p<<.Y@{UE GD-@)e4ymHK҃4k$-3e5ҹޫ?k/_K˸|d5B~n}[)'?IŲݬ\,SALe Nb**7k ݛLgS` jmN)K [iCM -Nhrz\Csc|F|j H'n.:ZTOBx5\2ŒfuR@Qd :NaV*: <1C<$% < ol.MQ*F"t6MNÑ]xyeQ $q0&K9okRx| bƋv-)*T@N+H‰dN{O8U'Z[٩3 4J-Knc2KnBIZkBZl؝!?]fvC8,Vv3YePED+v˃<@=/rNv['ܺtX0jO(B(M("t>xQ J#Che4զ${7fmc*$4hFbslD!H(ܜQH@$,!E4FLlꆒ*T"=`ZVw;-E?/|9|Gǽpy>'I![ei 571 {ȏB1!~Q|&^B;$#>4Nʥ d^=QC6oxPm4eM{=.rL{9d养pw)uCS}}=vc{߅}ӛ}Gwma<~eis1Z׮v>V۷zzt0}jq};{t>#x<ц%w$?747EQ]aNtn_ݸ=AEE+qi7ϭ&١DGqEN$+|/f a$Hj[;2YM9d&㣲b^Lr[^my$fsG`K&XNt:a$QT̿QvI.׾Ji/J_} uw2~@RT<W0c.!*u5߫29cưR./xI-OpBTEإ5 3U8"RQFm" sT؞9D Є|tQZWqZc%1F%ۋ:*Jg&)+$qSNA[E{Y`yD HH8.x)@-HOkF4IR;(QjMy@@:)oIQ^̺rQeMu5#vL5K^ʬ53Pj{(;wRd$GG. ^)n )Ф#=|٠mL3ϙ{z nNdQ1uw^[I((P俋r,]B6ۗhWϫMUV8v.j'O5'ɺ] A9-w/UbU)Vav-Bi_ <`J͛!Jd1|H+^} ;OdXh* `mW։8F^S5:0"e1H#pJH̓VQu _q48N )A=yl '):>U*%Uq {sMlfi$ffdՠU=ևTq> УJ8%Ӯ9c }%]͵VcAc 1ގT4ݪ2ԳJ13 xxg$۾21M^eKٌ2*ZA\Q'D^]B_몯pÊy.\;Cdoy[̛yNkO=S/烟|'}=^縳qao)ˉQw.iև;[OwO?~x_ iֿ~| >Qx~X+]6M[ ?rqʽԁ;'{vvgiݹ~w__;;{ٕ/#qx"FF^lxsH1H5i kY] l5M{s(fZ]zv6A~hA7e)=),[)lP;~>0K뭥>L,zvj֥u4\pzMlq A$]5ngsہå,K+lK)lRËPOxyr(NK칕UՕsgoQR_2 t#wh=/F @Bw/-Dcǃli)?M|s3ϓoOkg3(ax?5@<7x=2ϦߜueW)ɔ\a֌q0Vv1e;] (x4\=.ׯ߃L0ke $Vrh/(:Eb}6|?VBXVYnjRI?lZr7yQ6DV^M#\&b lgY *9ޛQu9zs|\#oӔ^tvgGJ/1vW H0I;v <»rNiJi*;x#y)[N?>e2$ȃ%'//?Dz5/E/ |7e} %#N42®(I(i6t(JbJƞjJԡU4)o 7XRco /ϼDIiQQH!Mhtdwz4"'P uu:FGYh( MqmƂp&8v8ܷm760ljZcve__Fa0]Qݣ{뮻2^,LW׺n8.Ga8jqF(BRזN̗;]_i4*az`Q]7:6~#PNB)ƐBH , ؔFB F{M QFe0ެ(S\&EYr! dY YB )~gMsQ0=Q8u3#E }%^!Cɴigm^$,g[s;_e$fYMs 86E:SNgzfh$1Mɨ dJ%i(4ti&FÕ0Pdd@> )t0Mjgyd5N6gA`egz=lu֠mmmk pM&+ sf`2WlU=[[ӝ7ڦP-y{1Ezլo_:WHv\Lj⎀@`^vA 9y|B?sC7E2`lDvxnak D 4;;7§ׯ,_:U׺m#:_nyg@=7ψ7ﮦQc<1vyӡ>ō}{} K+YŒF5fLlʴLHjnuMiY"FR4綪g; `YL!44mYҶ$ iɛ1vEymfZ*q}o[nFzeck%[ާumw(ݙl0L^KS|رHl(b p{Vf2лsp0LKZO+2GZ(%{[ uH0|CJGK[Օ7ooz`e{ |&?Ty-M|c j Ǹi:̺{.$[ѹ=;SPf&ӻ~WW=VVVV9z%{(nY\{n^UBW++Ht"B|o۠?=3FQr-(jj~GCӲ+fQLiscz)7I(3+kk󛶷=AlYZ~Jz?JFl: NJtkf=Qr-rKi6'KKqK%Y.6զ>p54s*ySM*j2Y`3gͣ(pV"[yqQ"_fJeEܰn[c{v K}gEMNաiH =37Lp4z0)*0q.9 ᛋ @p3k h[$2Y{w eUgԱmus0 n*$+DC}݇1/I9uB+6` 5Qס b{Hl@y3|:E^pk}̤Z# d 9CC` TJ1gu*? 3昆 J`sM e"d"%Y6>H}aNO`e70 6Kf*5yi^4T!T[??}76m|]L4S͸tf_.&`k?z_g4`7g>~_XB>`nyE|\ǥ-'fcDgs0"k̐ : @|fkkz(Эut;]*qEa\C%$o$bX(t]0R@;xІ1;WYdUN;"ЙF Ӣw %ܕ|HĠҲ9ŒČ0UUU52z.AӴկzZa(s;E ໭KmDZq'Jz$V(VkI"2}w$Ib g=YQ)]!6yFx`ۀ-ð/ǩzR ( pn[pb|~9aI -&іdz!]-L r~.ԅ_Aӕ""U@蠌g8<\Ȭv;JɁ#3&C LON ,-DR:bg\$Cm؎ TMlR =CX7uArn֏mI^kMKuцSCw+3=/">(T+2R|$>cn ,3;*Z0v'jƍz}SѺ*;@ BȢl2 m{m04RƐ{(co vwCda~R2ȡ fA(͝u|0.zcDO%T0m"Q zYvW8HnQ\vrss\`)Mԉвn7vV2wLk}hk{eu)jĹC)m&\ϯ+mGۆUZU 4 [WiFSx .\K&2ʋ qTw\4w\4壬~$ W_=gs<E~ _z崶NΝC'U8B$ OyAв,h6JVk~Z[m4յln7Ჳ;ue 0 *qsRBSEqČuhP>M!B?2CB "tq R[L3jq.堢j4!/oe{ʸlz\1e[LM+ﮅ[cw9s^^_@ʇeGLIez+`Zp4C9 mE42@@C&AQ\i߰ ř&B }ٍ`v6mI;>{λms`_whDitQIOS*Ƈk³UVL2(99׊Q͸I)2EE1[6p5mG); &YrP%V ۚ&7"dlS>0ĉvvZ^A%œg{>zٜNX_G0mCض|ȸ%Hvynݼ{jw:p[F|+sBEzدwUzC5~Umgg]>&u׼R̯|ۚ_oկi;*-ZklE tڲ,Wtzxj`x~~~~Ao}[ox\\\񋋋_yoE^X_?r/꼢|y;o|!\=*'w@iSm&SLD"˻&Fn}`g bŴI no sy{0:ŸQf<ݼ's[?+GkëQn7zYߌݐ}OC[&'L~|$|bzxy~m<{K^\wPzWV撚1<Ϗ\??~0ϒz_<&޲v!?|>l?s#qc`c#;ίr:l]͘0 ZFf驊{;\(KŰȿ69T&⛘S 0>*2E[rW'<~#"2Brd։0y= FLO8$Y5-%~C]4 پMeId_GS~\ttm!n3=]OO!΂!˂!s6 ƩFߘGeI%\q$q:1c r_6 7^kx/$"c7gEyP tR&YqBu|QO!";_!!},x߆1˽x\aUY/{U*Rv߂o;/>(|m%pDf6d `xx8Ev:/܅V 8۝N3۴zCd0X4m""r^|VX&SRM}lB^Brհsxݺt@Auf\bz3 hdt@JpR0lK 3]Ȇ](1'a&vlwOE,1MɴnV .G+nʦlP2ag_ʢ¸ .KLDLѶn}rn$&NvK;U)kKP,f#+^+CLIl]S1ުΕ z#yaӠJz=G#fl Ia$\U'zAXobє7mWgvmFuY9(g%Qj[ ,+-;X ^M4GlLe*wQzR3GJIMA^yw/I|K#1@Q9 Z:4IDpby%̤d&$1JHLZZ&]HB*&QqJ2#Q[@~۩#hFD%ҎkMSH((>NhQĂ#"("D9@CaI-kKA+KQH7}M#a|J|)C5(1JDW ` JyxIREAFuСb0FiWjfiEC0bRaD )a ֛(~0-rĸӱ o|)hx^C_Mnw:xtY [< .eҜWV%&m(pyZ4P>SNBtC(׿ X>ӡa/,hXizppnvup99iS}xa9x))VF#{|^YM>erGP,d2X.V[' 3 i;޳H= b@w&yx9^b:⠹[#:Uh24ZvJ {.QcNfsri}~ c&omv[:톆2Vh?]lyT^,%\,b@Ă fh_X rhO[v͋tEi [oiZەd>f֬a.{Tɛr9^\r#hEIDi"|Ev^M]rWEk:pug(HeԥJ!h}|5mU6*!B]."QyAN6RCF!Kޗ6B_Ceֿ4 ;>I{ wDMR <qUI EsMг<8$: Fıq!X14S3iGGk]fkg=Y(J}'8~Aߙp䀚=O e1OeE3%KvA.^4+Gk ~VG_GMUf$풤@ {"Y潳+ysIsHs@3=rI7ަnjY.cwݵ7(U^ʢ'^ZTB,1B$](fy5A&gRqDbm@ (Z+OLm3$j]QDV RF*)MQ(Z'rZ |53;>,x^;ֳ2"շPT fF lda<;pH,(XL ,n⍅Req̺.u4F-1d D5Qz;ξAlTFhdwC}APzVd}vSb.<==;8?=>DV٧9ҖH9D զ !¶E(fc/t 5a,ҳ"ӧwNs~zۭݷm֋a>dF3F3:;I>5ɚ R+ ߇1nXopdхajfޘ]ֳRѫQd2NT-i݁R`38iJw#cgbS>f'`\:ŻߘZD|fp|  wEJzѽ.c xLZٱ6t{sfs7lV}+j[8 ^ti aԵ8ècqV04'b};:v;tzto:tg闿29?|s2߈ko}Gu>_D-6Cbe L"GAr؄ÄH2-:qe?s2JK;i(fEu+8KP^@Sjv1O*I񔥿*#)J"Cz_* ݜػvZV;(dy"y*IOO휖so8QZd%7Y Q;D<&,0X_EǙVUTu(T}֠$5? Ža:2jC2XZ4b| z=1f'4M CgDǹŹiZzg*BK[f2-|-{,Z`+ӬseZ15u-IR ([A./0x'E4 ັ8E6Avd9/_yL8ehh(j qcvN[ˁgÆUOёw)92'KeǾ"AsW3MSr0濂K$'WrhK%_yᢰr6?eP0ΘBA 8BafRaʈ=pP@i090 WѴnEb8lpFLҲGJJM |HkKLkMj++[P\pn[O#P68"r D5G} V_ZnV_]ݦҲ[I^Ӱ tkuVAjV8c6[* 8M#rjҶGJL=7\k׉N Wvq=˼8!2j9HJKp,u$xu1H;n'ȷzx1!E$Lqh5 H}-@4 bh(>'d%^@JIedt\y (%.mBd욅ΠXt8^vСWCӴT6FBh?$el\Q,I9E'Ɠq0E8_f)Rv#4KKk ig|6ƍ,׿ G"+Z q52{3{I Op̿ 7>9L'/'u➡kx^@2ʹ%pG]EOW.5RN:ZT=DeYaҵ7w@pR:Sgtҕ hޟ,˴̴,3K2M*O)L3|RϺQv }Ȳ }Cl{nAN?F ,.#%hSEQИєP(/Y8*'ѻ. |'Ml^$ :tՌ7QuaV4;f 31ǔimד&GbYiZ,Ym׎-MӚj&'? OĎ.@ on 8ax\C!?ODq#MX::AfPjfR+;"-+NG8+)^߲Jq:Rhm|>羇.u8K}ÞGI+4bׇC?Cc7PfDJ_ܸ"Ӱʐq{3yJ/U<+>̭_Q;E+4pc夂;7#?%jTu __2_ ])y PCdBrMׄh@]ܟLl6v&~ʦ?6v;adێ9rdqGv5 6a#mڋ_g>?L8] d" 7բXeBLyRiUNK|߯9X\Uf%l]R KY߾-cw̛[znw?qvg]wݵ.bu{ٳggO>>?ߟc ~3? }ԗ`|AH/ʛx'i璋'_()Еz3E6^-rQ퀹o*q$h5T@z 4άZȝ-(E%3b]!"PVYޤ-{\qL 14RWgp,ě7yT/ju n ,Kih@l4eg; ,\  #ƗJZ DžǕV04`[/f(&P,!H<|-g31mзJX7h|Aя޵À(ԣƘCJR`pQ&qL83À:;Rql`30@c \Nhh<hK90 $ !,:ABiNp#>:G=4Ico. q5noz%$hx΢^qS6YUUwI!9P"uS{"7kfPa}ј"QD#0qL%wWxDDqŢ8B? 4 Q y}8)ıNDQ2Fک"YR1&@r@*DPN&D5YlLcEP4=KEn.ҹ ́ =T/1L)~!+NAp|"fE Za @ 8D H(ubQXt^8_LTD5OȒbħѺvG!A 6Y~Јk&fǤ8. $JRߡ{ =gH+h-)@dLb$>Zfyq@A9G "d 5a P21Ev$`*lIyoX"R'ǴH"! %*CTM(G3 *yM1e@WAӱ7[xiEqY&Qu]GHP S0gSDÔ+,9FN`P)E1 DV^ !% Zo26I9q_91)3FH.#a P>OY=;D)O2@mm5"ID.˚ZǞ:9U5AH>FY1#Y~݁~e-Tx0 +<3#"=brreEI꠬ jiQF$FQ9TDIwnphUjP`+镐29"%"Kb5D1hu3,0B/'[#{a>`4 aekrv#ps R VD|G^ Ӌ3{pPoLEJ s֏Gi9J)uh *ݑZO3۬]KA];=5)=՛MnCHXo6_r j``;bӰ`~^ ڧYq"T9e'Nʼn_ 2-nኋ%n]a&jFݲj t]MA>tbR&"ޭwDn+|9X}d36EuxtjR#\Kբ]-GedX@L'S.VV5nZn6SX*dғU=V2s^>tfPhQ*͚]Y$ۦ+V1rɢRwjt-2~Gf =2igKUF额3?5^ilѺJm-bMNO޺*+. hqnMֻLh^V3boW6mz|U|?YυgŧbxǸzJxd<:B$;Nؾ88y8ٶ[MdLHy=8T8#@ bAiO`'@Ei@^uZiz=ν>@W55H3ZJ/CT4XmVy$9$*_ƂƉO9. YQ4?c ZsEQ0"I1BX;3a.}1FdPP=@ԡiW[bHMY2wΙKIH"jkYuHX c<-s*R)R& y r%mTuk@sVZDZ{@E"B ؙdl7=mWif拖!2OY0O]˛v7\ˢXDbņgՅ1{-pԀD ̚_RsF6oBkVQ\eD(k0A3ܘ|i:L. :A܎;Y("0Y"T<29EHFrvՈJPoWZA@ z{hŗrzf7 ĞKzihTo̢( yra`a.8???s9!"4Q(&Ya1DDTE%%""!ce*].ZU%1XD&f[vw|ED+9 f=!zTՔV5y((~v僜P'(PU'h |:\D@$d06YVĢD/yNFCZ  T”hmG>ZD1 U6oD !f*+Mrv]}%msD1x@f3yGrg9HH9 HQD(ž˜M:' ,"QDv8KJ;[:i۴i' 쉦$Q!T4 CB۪j.ܪd2$krm o~pul6Bq8`]oc[P\~~ KK$l<coxX?6:mq^,7m@&RT6{6$B?;i=RCb;B C.ʿ^,K,wکg4I;gMScѨN&b"֩Ow|kϋΗeYVqm×Ae({ʤ!ƒCB$Y5um쭁RMHsXU%\]ecw*J^}_xC<w}|u;:GpJ|=~"~ п P}ꕜox3F#B9:q+\͵z8$./<"֋mup$_Vw̗;'v2|%ؿݬ(r7oqyBzC^CWt&Gf NV@nN[*n+bW ݢvKs?o<}ټ⦮8{g|)Y-ڝACXzXkTղ[iI)Y-vljX+*nA4.&c )g_]f׶AAm a]?mlK?7/̦M8f~V>!NJiȢ*N2ݵī/<<ģe!9XfHAm_>&.wh-Ŋ@k4Gj5+}܆< rp@9rPQ:3i&̤. ]*@a5Q! !Ywv>Z,R &NOiqsKLsJAحhɽڧQM;b3J)|A2aX$0O;8:TPC-\(d`q*EfQ~ uAjF?!xQ{Gd1Vi#PD *p%TG1+xg8R-@`Xda?ޓ hVc 3*$NuڭE bhЧH5I*$\)r`,O??BA݃Y0@0&'JקpNRZʺ\!+^Ȋ78(7L"aofl'廀1D\ x4xf;wW9JAv~W4kB,hH$#r&G '뎇@98MS\(߇gDRQ`?;Gtu~ 9\]s;o¿:i*2Ǟ ?^n֒iʪPۦi3YכrRrޭ7[/D J>s{0zk?BBUAW)a٭! i|UӃs,d]zh^{w|O;Q/sSf/{1<{۴Y -~Bj" U?y}M)WUh`py^tV8ep:z ~7{F 7i A I0531VLfQmmpʊ0YpikS})yCۧf00.26ʈcn֋ͦ]lVk:FP7;sy3jVY@v\jv?xEr""i)&]/nƺ~$cjN EhZ36kbp[QJ Q_)Q( giQAe`C|8罻bk(L P(ȋ?kDƏۈ|OQ/q'\&XyΒnooTGSBeyp6]>NI {Z'#Wu_^>p{4T uɇhT_L(ԙ nA|ݯ  aЖt]!& [Imɞ+0!9_ʷG\Q8͗n71c_M!.tvMw2*9^XX9ݸ `*x3y-Rk}h~P z׮]>?FMW, )uQ YWeQJ/j4CY6#MEF)(nfIL_3z[v 7nd5s//xM7U+"`'U5V-&v\ RA0o8ř0. H4Fe(:Ql4[i`$I`G%( #]'16 Ü3Rj::/e MJ[ 3zRP`&\$Ix2Q$\JOhgNВL$1'GT4ip;$4h}-UcSO?t4]Y&Mlv{KsG9v09t[[ޱ[Ran$G -%x[bc6%h pЇԂ6HVu#\C u>a=AeʇcJhX-pZN*Jy=vEZKQv`%.we ,>6WPn Y67}29~xj]%Quīe7C/ͺ G lXde Wzs]vM/d_pnv 6u[\^ge!g#7K9.٣?\.P۰'hY􂨼*'Dad%_)жtIbq肥?Lca&*V;O+ CtA ":U qԴEya ʛږcnzU5|.\g>dE鎢H 08t];\ 6tڌNv 2Pc>=C3^Ќhʌ+3kpGF ӒlP9 7/. a˚6'͖`1[t3/Гtm:#9uVM`'%!Oe7ɘ'F7 }כ\8k azIۺʛy( mj0rC=b\0aFM6W Q U;x,H},&C*fxD a&Y襂 +: Zsx&Դ<0Kc= qN[Bcfr"nZ Y⵷0kC=jgZ4ҵ(iaj B2MCEMĄEQ7IL?H$@h B>abBJpk(`z% u\צ~ɍdRd)Ҫ'&hD3 0yc$G:9 $Ș4D @u`l9J:Pygte tw)#0?ˢ6dY)r)N̉⴮gl_0rȳ&YeY*Xi57DdunXBh5o`r`ȹ(oAXCM*l%.鮺F\O$LiP #Q! t2IDa㒼8zʳTuCNY]MHAmWσ,_TO@+˙ đ@W(Ϣ"7|5uF.ZQAҖJWPL™Hb"ZyY- /ac$h3RY9s^~ UӲ5u]H5ӀERCjRF BUj {x=ܶc /+u:kXu%V7zaStFk4pG-aDa3s44߈zc0<~'Z6>7@gܹG4 㦮>BkdV4lEL*f݅zWq!\`eϸ(( wZ@96l)^OJ){vexC* طo(Iܡǹza2d}a9j֖ i6^S\m:ӂY>>-$W`퇠hYwg5F(_ |v?U)SkDӀZ{ʶB-cSץ;DpavM{abi:fu &t%գ[^ W3m@IjDO{vZ=fXTxBB'xU|?\x`%IGgq[^?{[ߦiZc1D^Cꡣ ^YON<-m*\5 D$5 ҁ$Pʲ.`$nj.gPgbPǑ^ +1 7llၹ;;}/78Il6դTM#AӅGqz]m˸VoCUNPt;'}nL'?4qkk/$-Ҕȼ3<sl qj~=$xZPg#x߹6i8Rfl;)lWMB3 LVg9h Br!O(=zds}fX~@{Rɭ[u/s@4ڳum<wE}}z!ڥiUnMRZ}Q_M+RL,nіܮ Q*cC*ثK7ވeZ X)qrspJQ0`J,>'. ؑN++!zьVE,^0CkAӢ`y*͢ȉc h)Dس&Fk1^YDIUZ7 TNMA)@IJ[+aTaOCd4<9 ٞc鎈kB*B? ~dcO#OJf0P[nӺ`ihSL6ʖ쳋H`;R@'-ZtPv'iնbZ9а-l"Ɂ˯]iTm0@-IOSfYT'wVDpK8PMJUUu[ VPq [0S]THKM[iB4[URԗJK`lf\n`cLx> }aRZa8<l/h`a'γ/AQ e͢ Ra-MKZ͏Ao,lT,F=Z < \qPσ({2L#ә)4NuỶDS M%.I릳xl$?>}^a%L@/( ۶fW3!,=4- 0 #lB?«!5t'N{B+*685փ?XUj0٩%$2\LS0?XXo򛚳eDJ7]&L/]t<)ðWVVCpq1g8LӸdJl[ePvd|>\^$BV0LXfюG_5O<-Uˌ-/iZMʯx") F:#D%B!2Q  @Km|5F*%bjPW]hLV o#\À}]u=h_[XXp*xC΍vM]_ta5uoF;0o&,\R/ Ez9zSX1,XOs?? 2Ȁ/THȋ8JLOwiCd:"qD͋gD!"B 8?yF33MS Ӻm7,LܛlMB,t`ƱBtiV4]`Gl c^0T60X>jia,BZ uU8b)hz.5^.X?LL=W][q UrlR3 at 2eKi|kmRMF>znbZXVH+ - ??8y$ Pݱ[O"~9g|RW$5@Z`Y>F2t^w9#ѡ DVVC¸[1蚭E v{4zBbǞ.zn>}0}#y[xKv3nc`u(~:mҤ߮rLbW*q iߐ_>^R 4/q9oI($mT#ZŸ_ }vJbQOGa J>\l&]L˶jK8ɛNǖ#fޮJeXj;Rb8Qyd[6 7 ҁȂaB0nn=B4vA0vRՂڇg VT\cm @ڭ`.E[3W9Bw-)/۬ n v'!]TڙW'WmcWꃺ3g:EZ]5;X|8OԔcٴXJE*uUT(w\KzLeZє<*vurf`SG?x ه2bz&(8Kڈ 1IMDWDjvL# J;DDpξD>JCQXia:!.jEP0ȳr$Yڣx>,&"D}'m @e *fbC/a!;3%fVt>/hcx2 䚇YNYE6fACY;ZBfސ s` v @EsW.m D$,J5&d+"ߦ(|[:q9eN,0dct*Oh:0 f0@ bAZf7XهA67kCປ_MGQ4i|nРl7o ,_{j75OO@1,|~7~R1G+f9frCӟ/j=M+11w~= m#(]4Wm{-Clə曑M-:1{RJcs*8L 2tAQASnN`ɔ%9gbF>f`LB\UNJ(uTgs~:FQ6G{gHHNqg (@L8x4aN8!6I|\"F4#խ$IBJ?LM$Fputtz+u{W(Q6$2l^Ȃ(((I۵r[wd .AAEfݍn$TKgiZXY+ {n=[Puuf]t#Syξ-nv 5}(4S;8￶TI ucYMŐú{ꕗ<6 ?hا>˜ILp=y3p1" 6xss]("Pu>?l/^!K>w !o ܸ.:\8$Zs+ݖ?|]'Ea5e EAe2̱SrLEko=0A`YlfNڲB,$ԑҕW֏TqU2 VxeeKG8 iU#z˜F:DkKHV zoAa0 Gwy2;' Y]K>*BM3$UA 35g=='[fmXxTU-g(4plM-T!H3,0'悘57Qq Iq"ZJ?2 Yn=zƵ*.v4p#[ȥ$;'4Mܙi|L`УwL&^] g]\;oΖ9 10f;y 3m>pț\KfZwRDKw_n|#ċOW#>a@@ ~u`iOtV *F~=[~/a`nL)%8Tc2IҬY0r354,6Lss\//aJPnB yX `,W)x[ϙfwtoe9cXF.]8V0)*,S_<WemЯP`57p؊jҠZ|=A֒Pɍol:@Lseڤ@0Q0zMekzqxNaSU3 |175Pի冡-k[K!>BxyB+R!vBCH]GH7!SEH|!GxB?!d~!g)Bc9BrU!#!AC/Ѧ;mm]vҾѱ@[-st)"}Gfzҳ~>ן~-_U5æ1B w3g2M]ϸf&tfB33yS;SYΛs]fv-ۗ칊jا>-컌8J:FjUp-L{O15fb'7zNY)E5SWI/!6nWI,+5z irگ^/[0ظ39qv9grζSܻ9󚹸K7\ޝL.pC\v} p`nzsSڟqLCws**x"Bwj/^Y|s "yo`;燷q~j~?kĦ}$/IYllV!}*[dJ٦lwlYv$}dS& )iW.{K P'Kҹt~N/]n[JyҽtoC]>5\ |K4R,÷Qh2F1%w_$K2B(S/djٹUv-{T`٫(VȾ $tCRY(џ1OqU2L̬Y2U<$s[C*9@jZir`wKͲh,jş޲9Y_VU˪5eM}J6l+Jrrfu}*,sK+ɕ]o*׮.[Kr{4T]r7{{4n*WJy\y(##IS<$O&y\gɳE`yF^/ʛyA'3QA|"'M_:z|}ɷRj6wOim/?O_Q ۇDžW}*e)ۼlmժl*`| 1wL^ST:i3bǘ2fǬ1[C^Oǜ-0wVy`X`?cX. %D,K2t,?+lJ%JI:꟱X'/ٌc8cء&v,]bس bp,Ɓqp4)ÂqnGLƑyqǖʼnpg\Xŷq]C\Umq{MYwݧqo ܷă=m<xA<s|]/+ej]o|۫v;Ue|_D o'(~5b iK鐇ߨۇNP3Nx8ݡuzDzY>vybop[Fq_M*[xםԈzr?٫4ޛ-UQzy'>8yF7nE}Ԯ>FL:/mq+UjkqK\g].*_I^],5  YVFlT +& {,o+; #d+OU3C)Ct1Dx̛IgU? #Z?A?7. wӧJ>׿|tgW`Hx {|JPuq5+W2'_ŲdAGu!fontawesome/inst/fontawesome/webfonts/fa-regular-400.woff20000644000176200001440000006146014605646413023247 0ustar liggesuserswOF2c0 b6$ `Pʃ˃* @eAQQaI=jo_q<<A )qa?">rs\qRCi+x5V5FU*u=AcIr`3f-8;찜%Rgs2KdYKJ#,KĎKK&i%n ԓG]vQ>w?S?L_ PY}ZNUW3mv鍗.J;X>=#IM?iu2#uq+O%Pb%fqze=:V^E^5T^5UBpTˇZ>1VCZˣ5j @ʇht4c'7y/-G7~+ªˇ`-O1}j@3VdzZP|<ܡW[>9S=7[>RɪHJ5,(cxts!h>sk^mi:]kexVpfki+;[|ƣjGVf{vBïzԡ<] Թ6Y[J|'h3nvQwIvYwE\vU׻nr[;GwxHO>"{}@~,wsECqMQ)Z)ŲbEVl/z 7|\׸M|Ou!5? L4,H+ML Ӳw!F ZQhu:P(uNՙ:G^ݧzDq=%HhXExb^ W+5x[[?d' Td$;iAKZњ6=`w6ȬgxHu#1x '.(jku}~ =5W 馤 zV zRW;zQԘ׹\7sٜ31gd6Yk&G|]{ӂ.)VS3LLńE=nq7>םw|7&78y pyepN9e@^{4=O9ള>K4D=njNwrg&h6!S{I}O 4`C 5p#4Jv:u+6X7DL5t6| ,R˭:lv;e};9ZiVyyx{zWxWy7xxywyxyi}v] r t{ƌ84`2 }pf A8bcf(a8aSf$NQ8cpִyӉ M7.M+f41ތ fn4qDb&]69:~#DAݏp}Ms>8@>#v!O||x7~^}Tw~fpFM14P,oX[Slcy/zJ2ȸaΰ]=ǧq0Tc3PtRF@p4 o! o'H`& "MI 20$H H{ [`>h$ `!"XDXLtj,#=,'0hv<,؉w;@9s`1_.*]`W]T{$*s`>7 m- ~j ˰'P.H4H JI@) $ $P$=$[ @c@@SrlmE HU9+ 5_l14i< 5Hy@ƀ+|j5 cX 2d\0ȅ×+<`}}`G` w` 8Q0h`(hE  #Ak6MI=@{A^:t̰Sʰ3.N@ݠ{٠ 00 00(Gr= ,=e:M`1ml/p8I<)Tt_8O1@ .R=LP!eN nPփ)&p3Cu!ZTp!p\M]r#}N!=6y |>&_o1eFQ{RQD"B&J_QP2@9΢즜 (aHX= $QPnrRS۔<%e(Pe(Sf@(RֈO,eȆ"QL&@'E([Eaxy 6/2BC<)D>{ / sPrDo"6hvE g.n7vFn)Հ kP[(`ף)a k-`w[v݀\؝ugAnQvwvk:nDݙvw|ce{I_@> p%ω!V_X}b% {o% V@|˧5E|II $<; C y*Zx셞Tc@210>yf ; 蝵 ?IS]>M1FsyC)Mҩ$ MKqͤ9O`#8MgHj x*4 y(`QI(o՜1BH!%.kבR\6M]71G/]@oΉǢ'>X$VS#'y&~ xxڇ)WԐY#8Frwr#1j-0 haaR-$|)V69.U<3Kr*bø O蠬-%/e~N t]҆u:ѶaW_)TrZoZy&&*\c4*JCD.L7&ljز{6|-kx}۲.4Z)K GbIC*GeiR!V b%!mShA׸퐃gFk"w8<.'Ury*qYE~z`9ʺ+u4pq:;R)F*( VJ@oqG} W$R"D5V,/b?][TFYRY!5BH G27c930;k aJ)<$@œNIPԵ_ 9*cUρhZwFFkd!אȪj}T"ơϙVWtSVT!P>||F1oNoLSjZ4krCVmP#,"hoO{|D'1uEn e*;W F(uGUW}A 𻕠AAt+bGt'tv9VLr 4K>UҰhs7qϱm[ >qslzssQqċwO("\}778;>_jwHauY'KkI9T5_9>ySO6Y^ 2 !^Eqd8j EyEBN'̢q=ӵ2~c. /=^Ξ<,ctBݿ͙asExHDdVi ׊RIY~- H>UiR?$s+p{vqsW(Blsm(k!5 B>|F ӌu`0,XފAi 楥'>ZkuhZ @ < 3EDLX{(꩐TNiH6?B`sxF,~l"g YzpدWq|, !P$1f<Tw՚aAfXXc0>ur7@d8uϣ>X^^ +5`PQ|[+Sj,Z~gݯ|2`_Tf.IלWYQmol q?`6})/sUOS2-n_-^5:,s{ՙb#ѿapQyZY(qZNxr:)\yM]r0TsL~uYeW?64`@L ^-zEopH (7[+Fy>uG-bq{uE/4d`ЊREgZ zY[kZ"K-rc/7{Tx嗙fRC_ MA;qM+` Q.0#Meaw-$mڔi=w*c++ʊA]vоcⱷE4̋jǮ;=D:g>3֒lS%F#|Ot =󽈐f& zH~Z2#rkze„ *8Bb~B(XQDbSJ8 UndiM%v6o~h }4J^,(糙b u"a$){{z!DQoz>t@ۉ9˚Ͽ9!FjZ vE$%{(ue s~B$ifؕ:mD$" ג$F*ШHXA$b: dCEs![c 0ecϖ/}qYy(OµkU'NOn[.?8M.vu͏r|^kvڱc2^/cxldqFl^8M慥%$ˣ`ppu6x^')ga@3:y<'sYTj, apQؖj6-LէOɡ'1;z^IAc*O$]_? o+1TNb$xR3 >嬸Tijf]inʛ }d}q}Gױg$*+Xy_OX!fʒJ"m0K+v"I+v6a=Yͯ\Y#VV6Wk $E Jv"Dk2 V8jjOHY$ɤJһ'%ҨT$fWTWO+^6FL>7r:u_Ec¯ƒ4(bMu1Sp$[оNv28SJA9AqOYK'O&}Mu-9])OmT E'7ܠٴ(~G*(&ɥ0]?%)FkʩSˁMk5@֢<;ri_yM*lmv4H^N3ZZȠlΧ7GcF3y9Ge:jƦa=6s~e6 p"La6;٪zC`uNxpW$P)Q\vT9jN5 y9u$EG=ؕ}os] #ђ?2ݴF]:N-x w7`QfcI-+7NKGEVT EJU|GqT\ i/g}G tU_QCcc6{(4r1]!d%X2m!mEyǚ 0]n7O͖%+-v pD>L랇6 ۮAbz1]!Msi5㙉!<0⸟ _(  FPyaGTc4]xv79ȅ$.Y(1a( 1uq؂g-?<7| L~ao5'jMD'I!,(0؜Gh(r"Rx^gp<*0qKH׏UڏTj\Vi<.o ] >5h)WƷ]-6 ~,xo'~2028-0[:2G?Q^l8ҟf >( 9~hֶlT$fM *u3r5F}\%P"E =.g}Mkkju)R\,e9"0/2]hkFhxnjh m,Vkh,gY)F8]a"` +ЛbckMO%81,6*Fqz:bR*_DVagKa<O}V}:S o6m[~qzjqbVoںX|kg|DBR7eYg([fYNYvK~Dx "Gԑ \/<{Y}NVN+0)յAк;;;륏$)vxD7#2FqSqXGp|8 hinj )7#2=,oFlkҡ?cr=+h`^ 4 .+N c%<x1ZWƨK("SRhz&ӓ*,' ƌ;LD| #CFVd 85rf"LM=3nL; s]n#ٺɫu%m@4 3\7yOX]~יj&1[f=nԣ9# T;.-ucQu4Pp>p>4kʹ*n?%x^%:81K9B4Q^Ƭ` Μ+jLޏ?v c8ٮF뙶?Ʃ_w GcEUqTh tGŐn]@a,=yttrD~I Q8ac\6'ȏs ϝKrv' %e1Ɠ;sFnyP^Z4]B̺BH#Bn\aV4?a[oٖ%aTCm[QUn2 ..Dי-9_b[B$7=t\w3PN[y1=gIqMx `~' h[# eTCkyy#FayGG#q7fQY"cQ$d{=PRtV=<4so 'urYe>:D3?K1a]R9}al9_k+y:A׽8Z>:jʀ97^TS&r|Eᑡ]7T9UdHX3hssO,y2V:E6.n7g3p6*$| ԡ-*%!q/ zy?6OEx!dʨp3=s%9a+ٰ 88a~mJؼOx9uM0[.fz S1g\ql7}ސdy#%@NuLGAf y^1H1)XO.[6o0'`LsvD$5f)1Vj,`0x?5U]U5{NyJ{8nI&e+&ˈm5=b%QEkt]٘麮1~X#| Yfղm䦬X$Y!p4 g ֽ6U{jUN]gGLu1] ǿ~6IƎ\`΂ F,Z2͙g]O/ {DuVJ!50*0I?ӷw瑅_+-O W[s afY"sY(DWI,ɰ" KZ撬b H%QX F$ew]3-K^e+ ؠb[e<?s ;u}GgwWXVZ9cPZ̼ٽ &yf+W{ؕ;d !&IvwcB$ݤnfjBnV3a':ADMeMQ,E!WnUUQ "Y"ˊ"Kʵ3W7*N,Dg "*,A/qQeZA H/T ~Ҩ&k.XLmsUN|m]ZٶmGQm*rܮmGZՈ.5p?<o48gdds=1͗' GǠN)o@H=;{%^T9K_e gDWY!CJhJaea#ӕR8#!;̆4MS HsRephn0"oGDnn99.P1*To=NpB:2=86}xj(\}Y?-m n`ݝg@^kӅrZri7]N˩*/SS kсuD}}wbMVnh{ރwet:m{X֎Z s:9|2]a^%FsKKKKie^$ϵıuM,M~g<-Ѻfj1JFG9`~q^4eRt]Ȳ"+*JO6ku9r< x`v RJ`g:Z17*!ӴCT*$. Bv{em$ԒwhDN=kvY5S+Σt:N! K`\J"ZhA#1F8+FaОۣzxe^`өH4)b~vT*A`CA/`^bSP+2%i:cl$,-l~4 M$Ma]3o{b,E!*|1MK]Vk $]q)cjuцqb&pbY/Elb-C*f[$FEGB2DB|J dML Q`>re4hrn 1׵=9u/ѝL&=YB\N&GW~m2ĶۯTB {kd3Ҫ@:>>/C P~MK(NΪ/}_>(y,QH:mKc8^9^{{߄w~ӟ'L7_túmMǃ4c}_7?p(46:0)x;|"ơ~ҏiv؉.8t:RqQAHD?&J"PvWEz'6~߯QDQDT/)nyU'Z]I"vE|?"2,ˈI|E$_8錱Ԗ}9l}r&+j%57eޥQMNW $scD]/zl:1м]h6 b/ hdۺhc{ߢc tJ׼vCRvyr:Q\h7"_iC$_HT&0HG@kn[8f卢T$5q1MaE!XpY5 D'E™ݡI*͜Y˖tlWFO~hkk{tP(B%eNu^pEuOtԼu>nS/?2F\1!qDA O7Ua, \nWnW*<߯u~GOYFpvJ%J$bqV"x?1BX/,sXt~mS:6XUw9-ϱ9G`L+K"biu4QDyJcjkZuX\a^]%̟0=5 >;51lD"$Q_fVfjyrv큑e_SG9a~ıCWM5.N`B>{+GٹBc ǸA~6رAfO ~h/y9Ǝjk4YiA0;q_S$'̣uJnkZ4\vu 54PEåG?*?(׮~68 ~w,_t:m-K׮.ⓨBrԻmYeW0(b!t|\ 坅VtkxͫW^m69EW}yܮ׺S>ׅB0PMIo/!TϺ90 %Qd؊|CfWbdvx0̆5XTB)We{zt-tú=Km} C%ȩKu+p|n.ɵEϫMqjwQT~*"$Gcr+e㜉:<lwpybRBcSW'Vδ ,l9a6U&} SϹqKpϰꞇ_[9iH.C=nހR Fx{Sr7DT{3 \3ҕ:|?^ӕ o"?'{]KD9"_ ^gwL0M: 8F- 4,"PСi GI~'kZF=CJ#QH ܍m聇v~g]d"Y$Hǁ%ƘBèYI}sbk7ފo{>s$cUMVJ'Vsky(d a?H*5~FQn3%Q` z o"ʮWg"cL;q [檤j3qD[' Ejv  щG9y $fxck\ܰ_tBBձI`jwWV+w8+Q;""=Ab7 X]+;לX{2"$z7TxFz%8 SoBuP/*ڍϸ 6\,F™%n?*I2P=5{Tˮ"5m5 ƸSm`PtmC,9^aU}˜4P)˚煷Xf>qQ5W rM l2.S6Z$4ղkO\3&+WeE_kj5 %ٵYJ!ÁS[*mR6..be]Эo2({<}DVܗDZB)/(r3-N'31LA`);5͖$2e~Zj}kRun'esD%oq"rp}2O@`N`|fb*O4Ef]M27EA 7KFu,@ȁi߸7nwhVyQڒfQRk?ŹOqclʹ,//cd p@L\ŗE"YfT08/[Ǿ)3z0/[8ekC*:kQlۜ%#omEmmGhaxnpȏh({Νt3 #I8Z7sݣ0 ֹo:iur*_$`a@BΣf(`ϰt$u;YuGg~MH|I5--wy9kfQCZQB<G1ȸzp?Wg=zwãnM&(9ObaZeUmP$̣vܙ\Ԣ-͘s(iBP3y>S2mNG8:]CwA8HɌ H'q ݞ'\UT|Qr]#b O\he:M ~WD$!R>c:U$ vae"cWpk LٝfP!VwJM%ig/L{Rkp(*Z3S+s-a2&L4\GZm0dMD1"bprJ](4_Q:5J6I.@|6lE;Y4 b+&vk#o,s$`QtĘxYd>FQD2q6P[ہEw={GD5v0ag7s]A~KZLOHtR0H^4jXEDYH;o'#u$_ g`C^x | O 8ֶB$BBM%&udQhf23 L<͑/,}Ccq(~vm{m

t|1;=ssss\/P p!ܾEp[t|xpF};`"`ZZf:<<6/uԴXcO|Qۦk6,z!L=Am<8l7|$ .9xi0FTi~۽t:T(W4m2N1B0$BЊpT2M]j6a5EwHg 8qϙbҐs/x.a;W[C[ys]oΏ ((F\b[alX=jυݜѝF݅#Du_s/Dk$Db̒"搤 lz2X9(Ȓl%a|T,dɓUm{ݡŻF c܀JN-DY㤳e}V*慣Lo>>-p0;ɕ`YWp&nܹ騠 =̋lFѨgp{kDZCQoJ~*CdtBkZYZ'&Osu*E0CsBaFnmRղRKԵrb~ӟłYi 궰<\S>Ud;U{ktӃSjs@6ڇ.C#SDBwαB,t&v(ҝPB(fp e۾%^*-U.կom+'t=nBY.ʰ֏2+Y؊sZî[xxU+;(0nyxFDz(6Z^C?BRy{󴣽Nޜ;2Y 39U ,S2~v }B.}K_(tVWWW)N }q@i}yF]NQ iid7|@U/&ڭ^+XM 2OOμX4MSڡ i:ZISXOBL|1,XYB#Ԥ̒.% |+lm0x})PUG_ oM;/Tp ըUH6ojǶ}y K^33ˏ.RdZ= I(Ÿ!%pi_O+g?ʿjOC_F9RW]T0?Vk*ekmHBh[˲l) r݁D &6 jwۜ Zn 'dQVTԎY՚OjӴ4zEsdהEx:y4Li{r4QƘPy(ͥy'\+ZɅht Ov9& !X6ĐTHϠGE.fy|6LBG#Tm|/2vt]V}!|_Jbv a.dA`9"lŶunϺ:r%8X4ϕY[dNW.?$Kf tb.DF5)Q[Pw. \n4eENod<&#Qsl,0odb܍3^̗&&LV/ YIy3^o HC7e ѭ'G57Nh4 È ܹscҥHซp}Y>l;`(c:]\Kp6MQ^/pfُ$4UוJ:e?s|_k͵vmb%X\`]Ծ<Ԟ86M4JZ4T+Nw1@\)FmC 0u6m` 6r -#~jC>=v0&t('l^čևMڧ>t=pfl"` JLF*-D&t+ EoL>JEmB*:ס(rN\\>#IC 2mϲoV}mWl;YnF_n|۬61q^A_Sѐd∞j œka$ה(yܴ}…z`iLPAgӒs%F&\NW/yy%5 vO223C$hwF&G`&wt5:FB=4htS,sHW(8u!-A!e¹E91"QZ+;K}fy(}TRZum7hFJR96d2&eZ-c:"Qu}d"pb7' SS?\@D_LAn`Lbc,˲$m%ިj~]^g}$͚⠶"3Q)*`qB)/n QբFŐ08sÐ0 1NחU3867% -}X S<)2/vMIosZOI;'Oj_@@0؜P$I$7ej^Zf1+DGs4E,#%لa j, pO^~,)xSRKs94:AcL;g4b5a2h?` ޲0^a!0-%rq/a]B$sbYB7qLANɦ6`x&5'-Rv|~ލżJSI4Ց`dTpJ-4xFSB !6R"ELbK 0w0CPHO@jsAʈB⌄-40]獯EkM1OOa5*O:b>AEGtŔ鵚㱻@uK锹Q+3QfEިу# mQj3'rOg/Q3] Da\5(]L^TAblH׾0ʙߝԦyzuFS^ߥO *`:Q%Ǖ?@d=_QsFwdcFbLdiBp|?M.E<ӳFNCXo @4vE} ;"OMθ*>o*#PTi:2):}.2c/Cwj,Ro^ʇ[iϲ8q !ov262#15-D }x:\?i|=2钻QLcZc{?5qLMj }SͧT"h뭗X {}WgIYϝ˼Ὼp,Ň ïGJV+WS;[XwlcoݓoP1:7w.L=6ͧWk&qfcssw] _L<#ϻ}b0;85L_o?Ħ7oܻ[_m?nΎ]_ܽl{~/@6/O<{H.cegw.oׅ[=={?;P?9\>jhrwx:ysl75_'S[RW3Biybvp򀋥(bEXKǁJ?^gtL h ka~r r :f^{ CyX/R -9;/b%I E(qH’#yzРo]h! &LΚ\?yd4yMN?Mi"<їr&BKM웜Sn~p1߿,tbhY$n/. ` W`+QtTy*VȄR{=!g@՚Щ.Ӆ"-qpH^SpmzyGX67WNV}aƍNEe4vk遚azU OʕFW!.k =G"T zTCD:jO(zT# UɽW58chX8TK1>V(qƊZo\eW/"3V2[zbuuUIG G!gl&*lsȷ$\BiUj`R5dښ2QUgyMa2M_ 2Ƌ~ߟ/+W.//:ֲi!niA>bA(6eQV'=2cMJQE8 5yJM+|3m]םfY5S%S BY64^]3.6{VN7苨*ѐ&Ƕm,1oP[ijW҅IW7Vc}% KE͕ɛXy*G79,뼍zkӟ(qr ۮ>yXx@.PPFS=Y@0TLr]c3Y^A&bTK$ !T6 @&rc=Oж1k tțͱ#J4[7[fC <|NXFR0:pB0:pB;85NtǛ5i5&mVNssjF}golw&4!o٘D&2DojBh4z=\]j} b;dNZ (*c)kp Ә(R\v_F^աe@: 0rӂL&m,/E͵tpVwmXB4Ҝ F(=zf'qDiNdSE+IMK84s>y{Ϻ馛nbXRE֬DӒjv];e=s^=H!:AXj8ބ8iap\IjYN/|OT'RD!AK="Mxõw"v},sRUEQ'9n_Zꃶ=3ǐmMvKHwjKHI.i:N$V%^:K 1|Ns7v v]BLf` %x>@ [H* x:e)UѦ9] zO1 t<_|^@bg>qVymYdo<h^i`&M/sp9P[n79o/^ pVùYO_l7`9`*Yh dadє뚺նwh9ad#cfS--,|iK TE`A/!gn1UY̻iһLGg[fMۭahGcvKVb߸ O|4bw-U֘ұE K\X,_( Ć#l { `fmREIT] C?5# 맆x;,p.`PsKrTtz:ͭA-pzZЌ?ٙaf5GF W10l!Mo5 Mv8'aK͓!b"6iB1ŸI ml-*r,8Ok. /?42͆%lQ* 19('⦰]pNݹD/ JH!TU8PU !L硁UV5Np 8z?pM70sRn6o4b7܉hFsd(#1(su(՚8-&1<>ƙ U y8 pKΘ5I/`aZ LW4Cb@!&뒠04F\uEw,ɢC'^uMUeTJ-w2 E,[pof%J$+la5̗Peۺ*Q =]w!8rCQ Gsf\Pozzi …ʌ3ETY|8Un*Rp[r@oк>m.$ !6QIfLdIu,T@дa[5Z1OaSӻ2vw>fŎX4tdeԜN`.g ݁8mM{b=IF FVnJP'Rcn_ՕQLk}.lxΝ8{2阮۶۽as¹Ydq7v8ƥg*kmQYkbt)5|>tgbx,jIq/'ljccIt6N oC?2m"2. ܌?zAb1=b +؃zanm+?-O=5{ݶmv_EO̲دe_E'}G{>wJ{ЇaLx>"vQlE iY֍ eJޯnʯ dn AFT-sK4Q:]- Z`1XL3W, Vh`4AX W\s1TRq Wp jSLy'Vݥ&os8Ssƀ1nʾ~:wy`,!Owa9ΌU eHM 0\<$?S @*P!e;(p% uFz~a4X(('3 ԕ?SehM9.<ݞd~b%Dr͉^uTKְn=~KsZ'Ž"lQn܎ {#/2Kh']BP^K}ъ\n6x{K;:YHWOEQW/7ʫ0n%DHrO w!0MLcBtq2$A" ,.)-m ND =؊Zȡ@XID$ZPD !D-،6"pZF6ࣀ< ʨR}JIC/mW yr袉m-dHŮ]| "tCEaJmcO@~ a%J5zkY_fontawesome/inst/fontawesome/webfonts/fa-regular-400.ttf0000644000176200001440000020442414605646413023020 0ustar liggesusers  OS/2_n^^(`cmapJglyfѽa8head)ԇ6hheaJ$hmtxPlocasXmaxp nameeD  post9; Xs_< 1Dž1Dž LfGLfAWSM!H? @@ @@@@@@@@@@@@@@@@ @@@@@@@@@@@@@@  @@  @@@@@@ @$4$ 4!%+9Zabcdefghijklmnopqrstuvwxyz#(##%%%%&&&&9&Z&[&\&]&^&_&e&&&'' ' ' '1'D'F'S'T'U'W'd'+++$+P"$.>DEFY\]ginpsu| #(*3DFGJNRU\e IJMPR[]txz{([%:?ACEG\},16AVgz!#*0<abcdefghijklmnopqrstuvwxyz#(##%%%%&&&&9&Z&[&\&]&^&_&e&&&'' ' ' '1'D'F'S'T'U'W'd'+++$+P"$.>DEFW\]ginpsu{ #(*3DFGJMPU[d GJMPRT]qxy{(X%:?ACEG\},16AVgy3.- qha]XF@?) s740/. z K  p l k j i h T  ] M < 8 / (     "* 6::.00`dbNLRjjD^FZ>B^fF,,(4d`( "Bjl..(  !"#$%&'()*+,-./23478;<=ABCEFHLPQTUVWY[]^_`efghijmxy{| LE!!#%*+09<Zaabbccddeeffgghhiijjkk ll!mm"nn#oo$pp%qq&rr'ss(tt)uu*vv+ww,xx-yy.zz/|#(#([####j%%P%%W%%P%%P&&i&&_&&L&9&9Y&Z&Z&[&[&\&\&]&]&^&^&_&_&e&e2&&W&&W&&y''_' ' Q' ' ' ' '1'1'D'D'F'F'S'S'T'T'U'U'W'W'd'd2''+++++$+$W+P+P301Q234e5]""6$$7..8>>9DD:EE`FF_WY;\\;]]<ggiinn>pp?ss@uuA{|BDEghF2GP8HITJNOQAERTfmUV WWBCX[7##F((**33\DD]FF^GG^JJ_MN`PRbUU[\edegikVmnwxxWyz{{| }GI~JJMMPPRRT[]]qtxxyz{{H=4((X[%%::??AACCEEGG\\}}U,,1166AAVVggyzjKKGmU7AA>MMgNNhdd42222SHOBCe\\zT{8l44W55WSS5Q2OIfrBCefAE      Z  ""&&++,,--..3366BBXDDWWWWW  22##))2aPr*n2j&>dJzb"T B r  ^ 4 X F v  n*"b,z.$6l.(2N##$B$%&"'J'((\()~**`*++Z+,r-$-.l./8/01 1|12p334 45,5v6067\789:X:; ;l;<=D=>t?(?@A`ABFBC>CCDnDE(FFzGGH:HI<(', 'p$#+'(<=* ('@:67!1131#1"'&''1&761316767&'&'#1&'&771#1&' (8%&&%8[ ![$$d  &%88%& $$ '6'&1331167513167&'#151&'1#17   ((}}  hh@76731#1131#1"'&''1&761316767&'&'#1"'&77 8%&&%8_  _$$  &%88%& $$  @,%&'11&'16767'63&'&'67716 02  00 ~D----DD--) I0 #'0  0--DD----D@, ZC67!121'&71#1&'   p l@"Dc&'11&'#13167674'&'673#3#1&'&'67673101013101015011101#10101&'&'6767310##5(5##)##5H5##)|  H  ((  (  $5####5:$"5####5"$:|  0  @,11677165&'&'#&'&'67671'&770 02  00 ~D----DD--) I0 #'0  0--DD----D@, Z11'%1&'47%16~%   P s P0 !167&'!!167&'!(pp0117%1674'%1&% P   s 04G6711673111167514771676551&'&'#1672711654'&#"3@" "4#5%$6 6%$`   ""&"* "6%$$%6   JW11&'&'&'6767671&'&'&'676767113276551&'&'&'&767X;;;;XH9:"""":9HH9:""'1#63""""3,    ;;XH#$$##$$#;;XX;;"":9HH9:"""":9H'%%""33"" P X;;))))&'177131176'#3#71 "" F\\p QQ @1B11113167674'&'67&'&'##3#5167313#3#1&'585##$##5lltttl  ttt  ##5%#65##Ȑ 0 ( "3276'&'&'&767676'X6EE6226EE6,8888,,,,8888,<446FF644++-9999,,,-1316767&'&'#67116731#1&'&'8hK1221Kh8h?2332?hp21KK1232??23P@-11113167&'#1&'513167&'#151673167&'#8@#111167513167&'#151673167&'#82116767#1&'67312&'&'&'676767'&'K1221KD00   >>Z?2332?X= 0Ep21KK12+*B Y9:32??237 ,"%5675151&'1!151&'16751!P p@311#1!167&'#113167&'#pppp`@ 1&'&'516716767167(--DD-- 00 D----D((0  0G!&'11675171176''1716'&150P vP ڗ @131#1&'1678$61161&'11#"''11&'167  p@ 611671'11&'167 &  Np ^5"1132767654'&'&#11#"'&'&'67676320((((00((((045;;5445;;54p)*..*))*..*)=3333==3333=@,3#3#151673#36767&'&'#1116758ppp,,xxxxA*++*App,,+*AA*+x871167'1&76167&'&'&'&'&'6767671''021K6+[ [*21KK1208H?2332??23:6 6K12k k0DK1221K'32??2332?Z>A @G#61111675131176''16767&'&'##3#516731#8nw e.'&:x%%  $$1:&'%%D^201'11&'&'"1&'&767676'&'&'"'01&'&'&'&71'1676'&'&'711&[$#; 96G >&$#: 96G    >&e!  $=   !  $=  3116713167&'#x 1676751671&'&'5167()==)(66RR66=)(()=R6666R61161&'1&7 [ p D$611671161&'11"'1&7 wccw aaJK pC 6'&1'1&11771176''17z   y    &116751716'&1'+    67!11!1!1&'&71!1&'P  /    i3@111!167671&'&'#1'1&##6731213311!15!!!1!1&'5@+ - ``+@-  ` 5777'13#3'17'17#3#17!671167!11!1&'&'0ssssssssssVss     *ЦLЦ  `  +b'''1&'5167676676701016111#"'0'1101'10101&'&11716751&'&'&01011001#"'/! 5>2 2>5 !/  # # -A6(' # # ((6A- C%,,%+(G1111''11'&771'1&76771716771117161'1&771'1&'' D o o D555 vVj i Vv 5  n II n  Olll U x88x U l '5L&'&767#471167632#"'&'&5!!!&'&'#167116731#!1"'&50'((''(('""""/^^#$2\2#$123K\K32  |  @----####11K3223K   5I%11#"'&'&54767632!113276767&'&'&#"75176''151&'1177111177110!"<=CC=<"!!"<=CC=<"! ` U9////99////9F::$""$::FF::$""$::F @ 9{@)<IVcv1!1671&'!671167!11!1&'&'4711632#"'&536731#1&'6731#1&'6731#1&''"'11&547632#4711632#"'&5@@@@`   hH     p@@@  ``@   @  -B&'11116751716771671&'&1#"'&15776711'&150P@;EI"  $&Uaaa)'*--+53KPE(1Xd"  N  $+6711671171611!151!11''11'&'     0w\ \0 Hnn9F1'1'1&#"1'1&#"1111167!%111!167671&'&'!676'&' S PP  p l+ p@0@ 9k'1'17167711171677717716771654''1&#"111!1676751&'1#!1"'&5147633167&'# .熆.:  d  %%%  pp .ņ.:d   '%%%pp  5V211#"'&'&5476763671167654'&'&'11771176''1716'&1'1&9////99////9F::$""$::FF::$""$::FQ////////1177111177110!"<=CC=<"!!"<=CC=<"!Q////////5G211#"'&'&5476763671167654'&'&'6'&1'1&1779////99////9F::$""$::FF::$""$::Fqo/@1177111177110!"<=CC=<"!!"<=CC=<"!/o/@5_r%4'11&'&#"3276765!671167632#"'&'&'7671163311&'51477165&'#1"1'&754711632#"'&51177111177110!"<=CC=<"!!"<=CC=<"!:  ,: 6   9////99////9F::$""$::FF::$""$::F[ $     C"Ih1167676767&'&'&'&'671167&'&'&'&'&76767671167&'&'"10#"'105211#"'&'&5476763 1(( ((11(( ((1$00==00$#  #$00==00$#  #"""####p!""!## ##!""!## ##!"""""""9Iiy&176''167676'&'&'&'&''67'165&'&''''654'23''&'&'&'&'67'167'''&''127' P i  #$00=3+*!p6L1(( 6$%61#.RRR"3***&.1(( &" $#00=H6X888%8$%6 0 R  ##!"Xv)* 6%$$@@@ " !!!$.$ ##!"F,,, !,6%$ 3<ENW`kt&'1#1111!1676715151&'&'#151&'1#153#31#153#31#1533#31#1533#31#157#3#51315#1513#5#1513#5#1&'5137#3#5131(@(hPPPPPPPP````PPPPPPPPP@P``@P````(00(((88h@@@@@@088(((88888888(88O7636767&'&'676767&'676767"'0#0##01"1#"'&767670101|(0_8888__88$  g/"":9HH9:"""":9H80# 9/0>>0//0>1( )%4E:////:://  76711673121311!1&'&'71!1671&'#1"''1&##+@ - `+@ -D@3#367716'&'!1116731213113151&'&'#1"''1&##113000 p p Dv!/u0uu u  #1?1!1!1&'&'1676731#1&'3#3#1&'67!!!!1&'67`h`hH`9t76'&56767"'&6767'676736767&'&'27676'&'&'4'67&'&'1&'&'&#&'&'X!++II++++IX- B9X;;;;XX;;9B -87UB'&!/##21>"+2&&&&22&& @. 21KK1221K  .@I11%%/+" -8+11'&771'1&76771716711171% o D  vV]O n ;;; U x2 0[n"'&327676767676'&767654'11'&#&'&'476'&76767676311'&767676p,..'&  ,..'&  "--;:; "-.::; y( &'3p &'..,  &'.., 0" ;:;--" ;::.- (3'&@ 2>J1!15167!5!1&'51!%111!167671&'&'!3167&'#33167&'# @0@800ppp @!>GP163!1251&'!5!16751&'!1#556767!111!1&'&'567&'7&'67@0xp``````0 =my#3#13367&'4'11e#11&567&547&55167167515'01110131#1##&'&'516767367&'##373367&'#1#3#3367&'#  3""$ R"@G0//0G@0@  (((0@ ""30(  ((((P(  /0G0G0/@ =my3#31##&'67471163010131165&'654'6551&'1&'5157011101#13133676751&'&'#&'6733#'##&'67313#3##&'673@  3""$ R"@G0//0G@0@  (((0@ ""30(  ((((P(  /0G0G0/@=o}563315151&'"1101011316767#&'#"'##1&'673167&'#01110167516767163636311#1&'&'5%&'11675'25151&'135675151&'@ ""30(  (((x(  /0G0G0/P@  3""$ R"@G0//0G@0@  (((0=o}75533111&'7"'11&5010151676731&#&#"&##131#'0111011676751367367367675151&'&'#1&'5151672711&'5137556711&'5@ ""30(  (((x(  /0G0G0/P@  3""$ R"@G0//0G@0@  (((0-U%#3#&'16731113#36767514''1&##1111131676751#11#1&'1673151#DD0 pD0D 0=FS!167514'711!1&'&'1676731211'1&11#1&'51#1753151#676'&'0@"J"JP   `@"@J"JdhPPPP$$$$)1!1&'167!%111!167671&'&'!@@p@0@$>113277151&'!5!167511#"'''671167!11!1&'&'@$$0P duuT3<Nj#3#13151#1&'167313316731&'&##1&'&#"67&'#3#&'16731113#36767514''1&##11i)))`` H,>)'0DD0    hD0DpFYj%67&'&'11#1&'&'1111&'&'676711111#1676711111167'11&'6767&'11&'51311)$%66%$1 21KK12 1i """ )6%$$%6)    +9K1221K9+   y """,AM"11111!1676''1&'51&'&'514'&#111!167516767#3#32765 8#$+ +$#8 0 (' 0@@@  ++;F7  7F;++  ` 0J==J0 /R111#11111131111111111131111111113111111111113111111111311111111111311111111131111111111131111111113111111111311111111111311111111131111111113111111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111311111111131111111113111111111!3113167671&'&'#151&'&'#3#31#1311#1311#1515!3#31111111#1111111#1111111#111111111#111111111#1111111#11111#1111111#111111111#111111111#11111#1111111#111111111#111111111#11111#1111111#111111111#111111111#11111#111111111#111111111#11111#111111111#111111111#11111#111111111#111111111#11111#111111111#1111111#111111111#111111111#11111#111111111#1111111#111111111#1111111#111111111#1111111#111111111#1111111#111111111#1111111#111111111#1111111#111111111#1111111#111111111#111111111#1111111#111111111#111111111#1111111#111111111#111111111#1111111#111111111#111111111#111111111#111111111#1111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#111111111#11111111111#111111111#111111111#11111111111#111111111#11111111111#111111111#11111111111#111111111#11111111111#1111111&'513167&'#1513167&'#151677673111#151&'&'1#15#11311316751316751&'#151&'#1XhXXXX8888XhXXX8888@  @X (0hh0(8@  @)K1!1671&'!671167!11!1&'&'55#1&'67315167131#11&'@@@@@@@@p@@@@@@@@5%4'11&'&#"3276765!671167632#"'&'&'1177111177110!"<=CC=<"!!"<=CC=<"!9////99////9F::$""$::FF::$""$::F5Pcv%4'11&'&#"3276765!671167632#"'&'&'1167676&'&'&76'6711632#"'&'7211#"'&'67631177111177110!"<=CC=<"!!"<=CC=<"!   (( "      9////99////9F::$""$::FF::$""$::F>  n     5Nat%4'11&'&#"3276765!671167632#"'&'&''&767632'&'&''6711632#"'&'7211#"'&'67631177111177110!"<=CC=<"!!"<=CC=<"!  #",,"#       9////99////9F::$""$::FF::$""$::F %%        5H[g%11#"'&'&54767632116767654'&'&'2711654'&#"374'11&#"327653167&'#117711117711F::$""$::FF::$""$::FP      9////99////9!"<=CC=<"!!"<=CC=<"!     x @);K]m1!1671&'!671167!11!1&'&'3#31#1&'5167'67311#1&'573#31#1&'516767311#1&'573#31#1&'516767311#1&'573#31#1&'516767311#1&'573#31#1&'516767311#1&'573#31#1&'5167@@@@H@@@@PH`````````3@&'1#1111!1676715151&'&'#151&'1#15!!!1!1&'(@(h``(00(((5H%4'11&'&#"3276765!671167632#"'&'&'7611'&551471177111177110!"<=CC=<"!!"<=CC=<"! 9////99////9F::$""$::FF::$""$::FmX X)71!1671&'!671167!11!1&'&'3#3#1&'67@@@@p@@)=1!1671&'!671167!11!1&'&'7''1&761716@@@@Q@/op@@q@/o0m%5551&'##&56767336751511'3#313312771654''1&#"1##33167&'11410#&'05&'&1&'&'&567673'111!1676751&'1!1&'1673167&'# >'  000jj@   0D--  P@@ $0  __0 }  | ---D-  @@P5K^%4'11&'&#"3276765!671167632#"'&'&'7'&771677161'4'11&#"327651177111177110!"<=CC=<"!!"<=CC=<"!3 8  8    9////99////9F::$""$::FF::$""$::FE888  8  E  )<%671&'!11!711!1&'&'16767!1'"''1&767311#@@@ h  h @@@p    p)<1!1671&'!671167!11!1&'&'21#1&'&77163@@@@ h  h p@@@p    p)<&'!11!167'111!1&'&'16767!1'&'516761@@@p    p`@@@ h  h 1671#1"'&551#11!67116731211!1&'&'@P Z PZ1=I&'1673113311!111!1676714''1&##3167&'#3167&'#@ PZ8P %Z`j&1111771677161331#1"''1&13312767674'674'67&'&'#167716'&'"1113312765514'&##D  4 3    a> ="a\ @ @9 8        ) ) !    j'11&''1&''1&761176''1&'&7673167&'&'&765&'&'&765&'&765&'#1"1'&77163312#11%"'11&55147633121##D  4 3    a> ="a\ @ @99        ) ) !  ]   ?q&'&1'1&11111177117677171676''1716'&''1'77111111'1&1'1&''1716''171677117271167654'&'&#"3'676'&'x SR b 99 b SS b 99 bjAAAN- -NAAN- -NA@   99 b RS b 99 b SR bZ---NAAN- -NAAN- p$$$$S#&'&'676771167676767676'&"#"#01&'&'4767670367676'&'&#"#01"#01#!))CJ21,>Y::32?H8 K11  ]4AK8921K4*)B>>[?23( 21K)## )<7!1671&'!1&'11&'16767!11!7477161''1&50@@@p    p @@@ h  h 5P%4'11&'&#"3276765!671167632#"'&'&'%211#"'&'&54767631177111177110!"<=CC=<"!!"<=CC=<"!  9////99////9F::$""$::FF::$""$::F`   7GYi{131516767131671&'!671167!11!1&'&'67311#1&'573#31#1&'516767311#1&'573#31#1&'5167@P  P@X000000000000@  @(00000000/ISiu3#31#1&'&'1676731211#151#1"'&551#1173#3#11&'51516767&'#11373#31#1&'51676751&'#11376731#1131#11&'515@0000Z0P p  `     P0  0Z Pp 0PP0P @ @`p 0@@3W7673113311!1&'111!1676714''1&##&16771167716'&1'1&'1'0 PZ700P %ZSSTTTT3S7673113311!1&'111!1676714''1&##&11771176''1716'&1'0 PZ[ -- %% -- %%P %Z 99 00 99 001IY&'1673113311!111!1676714''1&##116751316767&'&'##3#51312#@ PZH,  DD,,,,  P %Zh8  h8 1D^&'1673113311!111!1676714''1&##4'11&#"32765&#"1'1&#"1333276''@ PZ`   E)  ( 0 HP %Z  /<@  h9FSky&'1673131673113311!111!1676714''1&##3167&'#13167&'#1767674''1&'#13#3#1&'67@0 0 PZ0      P %Zp@HXXXXX3M^!!!671#1"'&551#1167116731211!1&'&'5''1#1&'5167317167'&7654'&76@P @Z $$ V    PZЀ #0# &&  1[671#1"'&551#11!67116731211!1&'&'471163312171631"''11##1"'&55@P ZP ` -  - `  PZ  h  `1CU&'1673113311!111!1676714''1&##6'&1176''177&117716''@ PZa00`00P %Z00"00 ;IWer%&'71327367&'716'&1&''1&1177167176'''''654'717&#"'1677&'6717676'&'6KK6PPD99  D__D  99  D__D  "PPP P,,"PPPP6KK6PPP,,P #,,P PD__D  99  D__D  99  "PPPP6KK6$PPP P,,PPP6KK6P1  (/7111132771176716'&%%11'''71  >| @@4VV{O0  :g J4 3EEE5<@HLRm%''"1#"''1&'&#1&'71676''167132771113#3#1367'&'"'377''671167654'&'&'&113167716''YYYYL"*EE*"LKKF::$""$::FF::$""$::F0 < 0WWW&/0S"::"S0/&9  !"<=CC=<"!!"<=CC=<"!F # 88 #5ESao}1!1671&'!&'11&'16716716767!11!67311#1&'573#3#1&'673#3#1&'673#3#1&'673#3#1&'67,`h``    p 0p(0XPPPPP'7LX&176''16''1&'51&'&'514'&#"1'6711631'''#167'111!#3#32765' P X+$#8  B$0 === /+@@ 0 E 7F;++  7t 02-0002;% E7  5X211#"'&'&5476763671167654'&'&''&5114763276'&#"3276'&#"'9////99////9F::$""$::FF::$""$::F9 '33(%%(33' 1177111177110!"<=CC=<"!!"<=CC=<"! &&'33(%%@)Jm1!1&'167!%111!167671&'&'!76'&'676'&&'&'676767116776'&'676'&&'&'@@@ ,)),     ,)),  p@0@ ))   0  ))    '7Qn&'6767!1671&'!1&'&'6771!1671&'!4711633121##1"'&553#36767513121##1"'&550 X   MF   @  L    @ ` ` `  KTdm|4501016723&''111276731367674'&'516765&'&'"#1&'&#!67&'1#1&'51673&'67"#11&'4567%3#31#1&'51#11276731367674'&'516765&'&'"#117676'&7'&7676&'671101"#0  0    p+   ;  ...  0   EY    -  }  j  j   j  j   ( j  %%  j        41315147633151&'!#3#&'&'16767!1111##@ P@ZpP p@Z'9S3#36751311#1&'&'516767311#1173#36751&'#11'556767311#1&'&'@0@@@@@04>J67!1#1111131!1&'6731516771'1&'51#1&'31&''176551#113P+RQ,,QQ,oRQ?-QR,??,RQ-?RQ""3BQ311111#1!167&'#151&''17167513167&'!'1#1516775''&'51311,QQ,P+RQ,RRRQQQQR?-QR,??,RQ-?QQQ++RDQQQ++Q 67763763763116751676551&'&'"&'"&'"&'11'111711116751&'&'171'1&'5147716716751515       &&&   +    hv#h@  " &! m 6   B@:&#1'1&#"133323236767454551&'&'"51&'&'"&'011101516710101167510101671010116751010167100"###&''1&76176751671675( X$/.4F/0 ($$5V>W , "X$//F"`  8PH5$$=e-.00---.N7111716331671&'!11311111'&55151115151##&'&'16767!11#1 I `0 00eP 6  |  0 L5CQ%4'11&'&#"3276765!671167632#"'&'&'75&'516735&'51671177111177110!"<=CC=<"!!"<=CC=<"!p9////99////9F::$""$::FF::$""$::FH5O%4'11&'&#"3276765!671167632#"'&'&'73#321##1"'&55147631177111177110!"<=CC=<"!!"<=CC=<"!  9////99////9F::$""$::FF::$""$::F`    )667&'&'111113151!1674''17165&'!!111!\0>> d00`00@@ml71##111111176767613276567676''11#"'&'4771671331##1&'#1'''&''1'1'1&'##1"'&551673327716731255#1"''1&#17716#113&'6767&'333 $   L$F+:8*'P   U# $   (<+: 0 %&'FHKK 333$     L!B'$   $ %!B  C K,G210301111#"''151477'327711!1&'5"11!1676751&''1&#ώ$$p   uuuu   )6HTam1!1&'167!%111!167671&'&'!676'&'113167&'&'#%&'167516751&'&'1675  $$$$ ""@00   ""@@p@@@@@)6HT`1!1&'167!%111!167671&'&'!676'&'113167&'&'#73167&'#3167&'#@@@$$$$ ""@PPPPp@0@   ""`'BO\%&'11&'#1&'6767&'676731671167654'&'&'&'&767'767&'& )@) 8;;XX;;7)0>>0@oF::$""$::FF::$""$::F  X*,,**,,*0$$:VX;;;;XV: P!"<=CC=<"!!"<=CC=<"!(2222 :LY5##1"'&551#11!1671&'#671167!11!1&'&'3#3#1&'6767'676'&' @ @@@@@""    ""`$$$$@2?KW#1&'&'#1#1&'1!%111!167671&'&'!&'&76773167&'#3167&'#"@" 0@  hPPPP ""@$$$$0`"/11!167675151&'&'!1"#!!!1!1&'5 0`f   7!167&'!0-9S#3#"1#1516767311#151312765514'&#!16751!1!!!1!1&'&'16767 0"""  """0  p@17161171716171611''11171611''11''1'111''11&'511'&7715111'&7711'&771'1&76171'11'&771'1&761'1&761151'1&76151679B% % NBBN% %B99B% %NBBN% %B9.9M'M  &&  N&L9..9L&N  &&  N&L9. 7HVdr731'1&##1"7'33#11#1&'&'1#1&'673371673133127651!5&'516735&'516735&'5167^$$$8"">%^  PPP777""07g0 0@@#=Uh!!!1#1'1&#"1'1&#"1#1&'51675!1676751&'&'!1&'1!167&'!1&'&'54'11&#"32765``g 4  E@`0'&:@%   p P ^:&'%  $@I3#31!1&'&'1676733676731!1671&'#11##&'51#767&'((((  XX@0@5W"'11&'&54767632#116767654'&'&'65&'#1514'&##1"1#1132779////99////9F::$""$::FF::$""$::Fy:   :kk117711117711!"<=CC=<"!!"<=CC=<"! ` ` cc5W7471167632#"'&'&5!&'11&'&#"327676736751312765514'&##151&'"10117711117711!"<=CC=<"!!"<=CC=<"! ` ` cc9////99////9F::$""$::FF::$""$::Fy:   :kk5W%11#"'&'&54767632!113276767&'&'&#"%&#1#1"133112771654''1177111177110!"<=CC=<"!!"<=CC=<"!' ` ` cc9////99////9F::$""$::FF::$""$::Fy:   :kk5W211#"'&'&5476763671167654'&'&'31133127655131674''1&#"9////99////9F::$""$::FF::$""$::Fy:   :kk1177111177110!"<=CC=<"!!"<=CC=<"!' ` ` cc 3'71#731'#3!17%3#3'1#"'1&771633121WWWXHHH92I8  p p x]]]]MMMM}0MM( @3Ni111!1676751&'&'!671167!11!1&'&'471167632#"'&'&571#13367&'#151&'#1p`p@PP0@P)J1!1671&'!671167!11!1&'&'6171611''11'&771'1&7@@////////p@@O////////@QZt131514'&'&'67676767671771131516767&'&'&'67&'#77311#7#3#133127654''1&'h 0  B:  0 8k      -.6!  *%% B:'-  !6.-  0 P4   4AJb&'1#1311#1131'1&567331317165&'&'#1513167&'#153#31!17%&'!113!127654''  64> >46     .  ( }  } ( h 4   4KTnw#3#1111771611#167&''1&'5147#1&54763311#17165&'&'7!1'1!%'#!1"'&5477167!1&'67nnn  2 26 2  vP651'(<6<   )    [  $ $' "([ 56P <(' 444   4@ 4=U&'&767#3#1#1'1##1#171#1&'67&'67673#3'1#171##1"'&54771673#$$##$$# 0 ## 0 ""33""    ())))xPPPP)3""""3) P4   4 ENf676'&''#"'&131'1676767131716'&#"'&'&'&'&'3#31!17%&'!113!127654''  _  ^7S#::# S7^   **    . `  ** ## 4   4 HQi{511#171'1&'514763!12111#1'1&7716551#11&'51#11&'51#!!!'1#1%1#!1"'&5477167!'&'51476321#P3  1 ) 0 ) 0  3@@@        pppp']Ux xU]'p P4   4`0 0!11!%#3#1113!51151#``00000``00`000Obu7&676'&56767"'11323271167230167673676767&'&'&'72711654'&#"374'11&#"327652711654'&#"3   $88__8888_0( #08H:9"""":9HH9:""/v     P  ? (1>0//0>>0/'  //::////:E4%        5Pct%4'11&'&#"3276765!671167632#"'&'&'1167676&'&'&76'6711632#"'&''&7632'&#"1177111177110!"<=CC=<"!!"<=CC=<"!   (( "       9////99////9F::$""$::FF::$""$::F>  n    5Jg211#"'&'&5476763671167654'&'&'76'&'&'7677'27116545176''1&1374'716'&1771327679////99////9F::$""$::FF::$""$::FH     `   `   1177111177110!"<=CC=<"!!"<=CC=<"!v    z          5Bc%4'11&'&#"3276765!671167632#"'&'&'&'&767'6171611''11'&771'1&736171611''11'&771'1&71177111177110!"<=CC=<"!!"<=CC=<"!$$$$9////99////9F::$""$::FF::$""$::F    5>GS`mz%11#"'&'&54767632116767654'&'&'67&'7&'673167&'#'&'&767676'&'7676'&'3&'&767117711117711F::$""$::FF::$""$::F`   ----'((''(('9////99////9!"<=CC=<"!!"<=CC=<"!p'((''(('P  ----5L_r%4'11&'&#"3276765!671167632#"'&'&''11&767632'&#"'6711632#"'&'7211#"'&'67631177111177110!"<=CC=<"!!"<=CC=<"!     "(("&      9////99////9F::$""$::FF::$""$::F       5?HQ\r"1132767654'&'&#11#"'&'&'67676323151#3#351#1355#11333#367&'#1'3#3#1&'&'6767'6711632#"'&'7211#"'&'67639////99////9!"<=CC=<"!!"<=CC=<"!( `       117711117711F::$""$::FF::$""$::F@000000000PP     5L_r%4'11&'&#"3276765!671167632#"'&'&'611#"'&'&76327'6711632#"'&'7211#"'&'67631177111177110!"<=CC=<"!!"<=CC=<"!^ && ,22,      9////99////9F::$""$::FF::$""$::F4   d     5L_r%4'11&'&#"3276765!671167632#"'&'&'611#"'&'&76327'11&'&54767&'11&547671177111177110!"<=CC=<"!!"<=CC=<"!^ && ,22,~   `  9////99////9F::$""$::FF::$""$::F4   t@5L%4'11&'&#"3276765!671167632#"'&'&'611#"'&'&76327'11111#14101&'&'&'010#1111111'&56767'1113111#14101&'&'&'010#1111111'&56767'111111177111177110!"<=CC=<"!!"<=CC=<"!^ && ,22,9////99////9F::$""$::FF::$""$::F4   O    Md671165&'&'&01327'&'6767674'#"'&'&'6767&567676'11&#"'&32767'1111111765&'&'7111111314101676767010311311111765&'&'711111131410167676701031111    R=NH9:"""":9HH9:""  ;;XX;;;;XJ7 ,22, &&B    U("":9HH9:"""":9H6/-7X;;;;XX;;,    l    5Li%4'11&'&#"3276765!671167632#"'&'&'611#"'&'&76327'111''1&'&7676171676'7161''1&76761177111177110!"<=CC=<"!!"<=CC=<"!^ && ,22,A  { A 9////99////9F::$""$::FF::$""$::F4    A  A 5Lf%4'11&'&#"3276765!671167632#"'&'&'611#"'&'&76327''1'&54771'1&547611''1&5477161177111177110!"<=CC=<"!!"<=CC=<"!^ && ,22,YYYY$$$$ZZ9////99////9F::$""$::FF::$""$::F4   000 0++ ++0 0/H_y63112"5676767116&&76767'6767767676'6763112'&5&767677761'&5'1'1"'&76771121'&771676&5114767672#"'   ASTK?HH75)) >) >ASTK?HG85)i  """ &#$aaa 88a       => ))67HH?KTSA;KTSA> )(67HH?] """  #$&& a89 bf   5]211#"'&'&5476763671167654'&'&'&#"11117711765'1716'&''1'3&#"11117711765'1716'&''1'#"'&327676'&9////99////9F::$""$::FF::$""$::FI&""&&""&,22, && 1177111177110!"<=CC=<"!!"<=CC=<"!{"%&""%&"   7Rs%&'&'676767676711&6767&'&&'&''11&'&54767676721!r#0105&'&'432''11#"'&'&763276'111#14101&'&'&'010#1111111'&56767'11111311111#14101&'&'&'010#1111111'&56767'111 !<11 4     4 11>F::$""$::FF::$""$::FP     %%% %*E`z%&'11&'&551&'&7667616767!671167632#"'&'&'74711611'&54771'1&5%61111''1&547755&'#1#"'&'#116767;;XX;;5% 11 *  * 11>F::$""$::FF::$""$::Fc0 0++ ++0 0%%% %(CT]jw%6551676'&#"'&1&'&'6767671167654'&'&'276'&#"76767&'5&'&767676'&'11&'&'5167313276731\  ,22,  5;;XX;;5\F::$""$::FF::$""$::F`      ----  4     4 11>X;;;;X>11F!"<=CC=<"!!"<=CC=<"!$   H'((''(('% %5L_p%4'11&'&#"3276765!671167632#"'&'&'611#"'&'&76327'6711632#"'&''&7632'&#"1177111177110!"<=CC=<"!!"<=CC=<"!^ && ,22,       9////99////9F::$""$::FF::$""$::F4   d    5%4'11&'&#"3276765!671167632#"'&'&'"'&71111111111030521676767654'&'&'&'0#'11111111111&547111111111111034121676767654'&'&'&'0'01"111111111&7632'6711632#"'&'7211#"'&'67631177111177110!"<=CC=<"!!"<=CC=<"!1          9////99////9F::$""$::FF::$""$::F    J     5&%4'11&'&#"3276765!671167632#"'&'&'"'&71111111111030521676767654'&'&'&'0#41"111111111&547111111111111030521676767654'&'&'&'0#41"111111111&763'11111#14101&'&'&'010#1111111'&56767'1113111#14101&'&'&'010#1111111'&56767'111111177111177110!"<=CC=<"!!"<=CC=<"!1    W9////99////9F::$""$::FF::$""$::F*    E    -%#&'&'6767665&'&'&'27&'''&'&'&'"11111111030210#1"111111111111111111111030210#1"111111111113676767&'&'&'676767'2711654'&#"37276'&#"767&'11&1771676'&'&1'S&-X;;;;XX;; "":9HH9:"""":9H5/+    x       b U ;;XX;;;;X"(,H9:"""":9HH9:""      L      Y 5J]p%4'11&'&#"3276765!671167632#"'&'&'&71163312&'&'76711632#"'&'7211#"'&'67631177111177110!"<=CC=<"!!"<=CC=<"! ""..""       9////99////9F::$""$::FF::$""$::F:  **z     5J%4'11&'&#"3276765!671167632#"'&'&'&71163312&'&'711111#14101&'&'&'010#1111111'&56767'1113111#14101&'&'&'010#1111111'&56767'111111177111177110!"<=CC=<"!!"<=CC=<"! "".."" W9////99////9F::$""$::FF::$""$::F:  **U    5Jd}%4'11&'&#"3276765!671167632#"'&'&'&71163312&'&'7'1'&54771'1&547611''1&5477161177111177110!"<=CC=<"!!"<=CC=<"! "".."" YYYY$$$$ZZ9////99////9F::$""$::FF::$""$::F:  **000 0++ ++0 05J]n%4'11&'&#"3276765!671167632#"'&'&'&71163312&'&'76711632#"'&''&7632'&#"1177111177110!"<=CC=<"!!"<=CC=<"! ""..""        9////99////9F::$""$::FF::$""$::F:  **z    5H["1132767654'&'&#11#"'&'&'6767632%6711632#"'&'7211#"'&'67639////99////9!"<=CC=<"!!"<=CC=<"!      117711117711F::$""$::FF::$""$::F0     5Ban211#"'&'&5476763671167654'&'&''3167&'#1'&'11&'6701327654501676'&'7&'11&'67327654501676'&'9////99////9F::$""$::FF::$""$::FX    ----    ----1177111177110!"<=CC=<"!!"<=CC=<"!h    '((''(('     '((''(('%@Qbx%55&'1#&'51&'1&'&56767671167654'&'&'276'&#"76763276'&#"75676751&'&',44,;;XX;;F::$""$::FF::$""$::F`        v    *vvvv&&-X;;;;X-&&j!"<=CC=<"!!"<=CC=<"!$    Z      1FSfy7"'11&'&'6767"''113276767&'&'&#"1132767&'&'&776'&'71132767&'&#"271167&'&#"32;;XX;;;;X+%!"<=CC=<"!!"<=CC=<"!    /! .B0      8QX;;;;XX;;F::$""$::FF::$""$::Fq  A *`     5P%4'11&'&#"3276765!671167632#"'&'&'1167676&'&'&76711111#14101&'&'&'010#1111111'&56767'1113111#14101&'&'&'010#1111111'&56767'111111177111177110!"<=CC=<"!!"<=CC=<"!   (( (9////99////9F::$""$::FF::$""$::F>  Y    +';&'1111771176''1716'&''1'1111'1&#6D o o D5 vVi   n II n 22l U x85H[h%4'11&'&#"3276765!671167632#"'&'&'7211#"'&'67636711632#"'&'&'&7671177111177110!"<=CC=<"!!"<=CC=<"!      0$$$$9////99////9F::$""$::FF::$""$::FP     P  5Nh%4'11&'&#"3276765!671167632#"'&'&'67''1&#"1'&567''1'&54771'1&547611''1&5477161177111177110!"<=CC=<"!!"<=CC=<"!11"&&"*YYYY$$$$ZZ9////99////9F::$""$::FF::$""$::F@##000 0++ ++0 0<!2V ,n C< 4 6 u B3 6 d1 0 X . & uFont Awesome 6 Free RegularFont Awesome 6 Free Regular-6.5.2RegularFont Awesome 6 FreeFontAwesome6Free-RegularThe web's most popular icon set and toolkit.Version 773.01953125 (Font Awesome version: 6.5.2)https://fontawesome.comCopyright (c) Font AwesomeFont Awesome 6 Free RegularFont Awesome 6 Free Regular-6.5.2RegularFont Awesome 6 FreeFontAwesome6Free-RegularThe web's most popular icon set and toolkit.Version 773.01953125 (Font Awesome version: 6.5.2)https://fontawesome.comCopyright (c) Font Awesome      "# !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~ exclamationhashtag dollar-sign0123456789 less-thanequals greater-thanabcdefghijklmnopqrstuvwxyz folder-closednotdefheartstaruserclockrectangle-listflagbookmarkimage pen-to-square circle-xmark circle-checkcircle-questioneye eye-slash calendar-dayscommentfolder folder-open chart-barcomments star-halflemon credit-card hard-drivehand-point-righthand-point-left hand-point-uphand-point-downcopy floppy-disksquareenvelopepaste lightbulbbellhospital square-pluscircle face-smile face-frownface-mehkeyboardcalendar circle-play square-minus square-checkshare-from-squarecompasssquare-caret-downsquare-caret-upsquare-caret-rightfile file-lines thumbs-up thumbs-downsunmoonsquare-caret-left circle-dotbuildingfile-pdf file-word file-excelfile-powerpoint file-image file-zipper file-audio file-video file-code life-ring paper-planefutbol newspaper bell-slash copyrightclosed-captioning object-groupobject-ungroup note-stickyclonehourglass-half hourglasshand-back-fisthand hand-scissors hand-lizard hand-spock hand-pointer hand-peace registered calendar-pluscalendar-minuscalendar-xmarkcalendar-checkmapmessage circle-pause circle-stop font-awesome handshake envelope-open address-book address-card circle-userid-badgeid-cardwindow-maximizewindow-minimizewindow-restore snowflake trash-canimages clipboard circle-down circle-left circle-right circle-upgem money-bill-1rectangle-xmark chess-bishop chess-king chess-knight chess-pawn chess-queen chess-rook square-full comment-dotsface-smile-wink face-angry face-dizzy face-flushedface-frown-open face-grimace face-grinface-grin-wideface-grin-beamface-grin-beam-sweatface-grin-heartsface-grin-squintface-grin-squint-tearsface-grin-starsface-grin-tearsface-grin-tongueface-grin-tongue-squintface-grin-tongue-winkface-grin-wink face-kissface-kiss-beamface-kiss-wink-heart face-laughface-laugh-beamface-laugh-squintface-laugh-winkface-meh-blankface-rolling-eyes face-sad-cry face-sad-tearface-smile-beamstar-half-stroke face-surprise face-tiredfontawesome/inst/fontawesome/webfonts/fa-solid-900.woff20000644000176200001440000046136014605646413022730 0ustar liggesuserswOF2b 9b6$ `D*ʖ˫Hm %yت)=zHy~\F҈G5'z!!'z@v!@.7 N %Zj`w5UcIKVێqLdGq\o'8$;!{570Q-܂~:XFnǓ5w+2z)p}- ˧ZVݻKp2SR~No@๡ rfȱ*D9Xu [ |lݠҴY^qxJӥHy;G^)󷌍Lƅ~4988V4X2y/Q3=oX u*F+{vS/oBt+N|hv~W*2w~"NO.) +}M᫱7yWY0|sa ^;"U y,:Z,C#?à:wI)gvY^~)f?l9O:|WVƷ\.qU[LשYc͑q1} |;Xtz`S{8lV>z9kZ5]EEhɡgq6k0yEPfgWWu~^= 8H_~N\A7hTsS=9O.TPv4_'B_slAxb#.j86gШt*WeĎ%{h.]ժLn5RzÑ=מƖHKW+hr)5zϧ?e"ϝ. {fRLu~z4[*UyCB9q<*|h3[J:eu4wɳJ֒9y,RgFź250Nr-}VKNhc<'xVF3W]hCgRog7;bB>1GOJTW5h~jpE|۠Wir4>)j>77cAy5!Q?_ó2_jR]B׶>:6וԜb"ϑNU+FΊL~n~S{sǠ@ۿGyݥ8ya6.|0JV Q\w2$;?=݌3繘6ۈK2SG o}Ҕtr)5r8irZ-t2?t '걓TGm:K8W/>jo9nx!ݘ=27y/ꞗgL ooczn.e|Zg%~?.fWbĢg-4'WJ3+'Lہx8NP~aø+Z4T~ש+;a)I\!{nk^u r~1PyV>@ܵJ!n@aSa>bc&b&c bcfbfcb K˰p'p gqM)4Eig9iN溹c#v`7Mvbٛ}I;qu]=Wp{޺w~Wz'\ jgAE>Ә"F ۲3Cv(dNasWdYM<<<£<<<ŋû|'||W_+-DIK$JIdHdI]zJ/#e 2IVVE]<̟0r ]2WՍru wڝwwSƩ REIw+e̔Ų^ /+~?KOLÑcZAkju%BwA=ַI= C& #8 ְ/'ގy;1 )P UP5Q  }100s00+ pp(+~'~7gla|&`"&e2`Jf`Ffb6fgna^c!d9Vb-f#`Ke'N..JjFq5S>skgoſE2YA+eeճF:mcl6B[dKmu6c총sƇEs\6Wus<6/KicĄ(&mfemv=4;αK.{^=>ln#MI);\TJSyHUՠZTPcjJ--u.ԝz N#iM)4ZL+i mmtNyL&ݦ>  pA.Ÿ\&{|o~ 9/ˑMbJRI!$d\_J(դԑDI+i+2HH-dL2OV&{d3rA.U)w<J;,U1& iّPP5P]1#0 0s+۱pqpq O Ewq\|%t\Rܥvi]&q]}5u-\g r$7qw=to;erx^ŖU h0+`;3ُ&6:d 9r*qH@w}~?_oy2ߧuy*b8*NϦjQM'5TMU3"T8V]PGUTV*H}SjN{:D:zi]VCrtQ]FWUu]W7խtkAwգt=KQ>G:@c:Ígb&fJohff/=Vǜ5s1OKAh{Dv)cfO^ŽNq*MmGBݨ74$Lh&-EV._+q*.ȅ\qu^[x'|Ï<3) j!mtO+dL9ZVMߍ]>IοEF##yQQ4CkGg pLTl, }-؎؇C8s+: =515_8HjWM]l>&E9svNe+-gF<qow@\~ƒ1wL 9W^raovaCXVEaFv>џ.Or/sw]7WUr\9WtKoe?`};{ko쵽M+d J@+2@K@-@ hߖgj逦ihӚ&q1!h[W;@mQT PKP3@MDP W=@uUGUB ʧ<`:4O~[o+>=wmu^)x~nfb.N8$CgqGq$A}M_W}g3)WK?t]uP+BKH5O35]5FWNuULUNeTZ%UBULEUH_ySٔUYQNiLɕLIWb#goď|||hOSܾ/־g~?m-6FITUzkFkj&j&kfhhWuٺ@"]Kt.N6ݮ{ԛzG }<-"--2- tWZ^x]oͽwɻ}>gL}]}/X?O ?Boy>B_}ujKsMtOz(=K҇y*}~OҲ)d˺f>Yjtkɀ"P ȁ Ȁn@*0 pkZpu\pWpEHW rh8ƕc]ǹ2pk'I#p:.iu..O/ACcaዠ'ZAӡP̀Bh@t/.£ХPx O@@yPxY( ]Jxm(^ ~ux=W(3x3|W(u밻*Ր;4 M%|1ȗ>|9SWއ|5|k`A1[a7Aھ J@Pz !fA*qm4Nk @APSG "!턨Y@T@! H *ȑՁ(!NHAtAz+́ ͇1tgA?bO{π~&ā!8z4#~YWCq.|!yąCB7[a@܎t.=yB= A-xZ !h)BGeB!fA<.|hěЇoO@e!HA| o%? 6" +/ZXԜNe/2:աP;k«BA>Pn®r#1ec`CPVH 恡G8rud嚠Zz0Ŕ?F)4z0z"}A"Te~T0f1Ql:٦@^#N=zS0/x^SoB} >Dl@}؈R&ԷԷfԏoa"V_xia-Yf1Z, L.BJ FNsZAs< c9؛R\Ms3ݰ?pp p{p0pGp(p/p8pp$c8K 8)p<'u 8t Lg2pb &8vq8v1OʸvwE}EH{.=0\F{ JhoWE{7nOkq3sM/ mM;wiG~OhQ]/͈_ztsƣn-tmLZnSHC?i#N"mFw Y=Ρ?tWtJ:.HOw?f`҉ ࡤD<DݿS !}M 3_1N '"ACO@&&Dh|*111)Rb2ZFHWS"DL5FXtƨV&!'=A 䣈̇+k!&669Ho[ Cl58TO$ $EMC8q$.B+fĕD\M\CB\@^<<4&yBm ćė䙈ZRns&C.&:QZďcD%~Ւȧo&$'/EA>mƨN^2֒קIk2e\zP(H2aD2 e )%ZTyS4țQWD2Gޒ2Y$oKu=Fen( Q%AYغGY"y?JK,G^2i5IR M^oNCހq=cޔd^}Ig'A:|yZO6kOȧ ]L>K.#-i)9.'W2]A|J IWoɷEBwn K~`S"?J~t%ˤ"!{Ξ2ԟ!J8{ȿ!EA/c&Gz2e@ex(P&&}@2|d27WʼH(e3YY~)HSV|⬬JD EY(;*"FFهq(Q qIrxIHO9Q|*4bD9K (KLDpNr111RʕĤk(SQMLCGQr#}(:҇#}!'Q%ؒb+kؖvO%~%ؑob'꿒%v -+mThKNRbT1 mvڜĞU}.k "?mhIH[B RӖ8ġ%*q8m #hđ í q m3ıU2mKۉ8+mw4ڞ3i#΢`!KhӎC\H;>ĥh'NI\A;vε׬]7!q>ƍ{i7=LJ{8q;IIE{:"D{ >۴h>!}Nx5|>$}, }>atLY)sV%*}1[FK?~/g.J5 6_O;w2ؖ~7^?`'#F}/_fpU C28 181"N$Nt~8o3"N38tKg!q9Hlr9$SIGN8\Hq98q$"\IrUkɵ$#׉ ȍ7[[۪dFnOHNBFE!{ɽ$#oϑ/K=-w$> ߓd|B~A~I|J~K~G|N(/ɟKWķhI@.~$'\ڋ?Q}~/ 7j5zIV!'5_Դ7535 5JԜ\bDRKKbhj%11ZZGm )ڒڊ֝E;7/u8uu4u5uumuML]&MJ]CMN]OH65uu'm:A #ԣ'fJ=6;<mk =uMYO /IK䓉uD>X'Ӊ-|VR@>) Jȗ'J|em 3Hī0'^9i9"ibD<s4⟘/41$m!̱H{sl⍘66渤]93iHsZaHT9I[s./1#qsaHn̕H<21 ˿;G #^}1pe%AƘ6 汮<-y1O$U̳`̳I7<敮· my-&H{zW'Cy'iyw{qu8}vݍ!!_ ݼonw`G<;ⷘ t\^fXX# VXk@ba!$tc ObGH,5*i`CbUqI5հ& $ք$ƚRX kraMMb.H5#f"-$ĚĜXskqZFXWIxQX'.֩$:i!sHu.i7cOTX22r>ƺąXד;oaH˰n"1,ٰ֭n';`ĨztsaHX/UaN 3Ҷx$VXX~03?_`~K Q8kwX8=pcЏؐ'0ODbOGbq#1%/A`$~edkدOKb^T_@3&-w8{HK$3K5$;Ҷ{]=!?x?Jk_"W?}@N^F0ڷ < ZM0j' >z9 *H0-'?A07OqSA@-TrPEZV*W MHzeuYD%mj5YqwO<oۋ'x;B!#DR ճH @2 u>gb\,R;nH%~UFYyV1&%cIXGqJq ǒ1$cI( ( Vx&JR]JUrUGNS#hS;򬪴`7φ, ʪTV7Rt Rvy\l}B~;{{qb8yNR6Kt5륜!VL\Lw>N:c_uNTBmjΨ+~ujXGNy6~ש:V^\k3+UY *d!ʽ2&Zm\Apq)i8tkp,,D H1&qʘ\G\)(%<--rY C1$cԠٜ nZmf`vKrJ 7qB ]r .EmǑJ igԦJB?+[OobiSȧBϑ8ba?uap^g NyU&<ڦ4sQ]v(J(=]0}{a;\xkAi0&wQ.g k峟's d #x4":]jBmJ.~UyzP+-ǝ\q/xU6e GmXc lE'*QS,aeSmVg,{xKdBl6a9v gWw&@m\M{TRFp:cώcF8sG#mm;ο<v)5ѠҢnS]Gdy?]X-ESml|mC̨BTG 0͍Nm?ӄanW),ӟ: J(tnl:/s]n t ]V{Ց cK1%Yg,|b&S"Vێ"(j,v"}ؿyvpVL9LQ\ԯE$ο3'2o1jSC%8퉕-s{LۘSIմjz%'8-?wr MixQƚ8 <(3Loy?绌څ3ī<#|+pՁiGq_}q,JEpUe!q؟=~AD-.D֧+=Ct?}8k=/%[/Yqv{ZE~6Bu9aAPaTp-ʊ!3ir:\'Jg ,/+Z~}? }]AۧVJ6)뽲S)qW:J8VlFAU{+ͥVLRs}8f M}$6Ŏ8@)o2?2jP;V*gQl6vSV#m EtF 4vwǘf1.g95>Lr-{=|&hsӴ(缞68S| >sӴ&n4L0b؎UDkexIUII_;黋' kcmM,S +irS< Gץ@0a'p X4K rIqm9oqnSyG./QvcQ8ivL1]IS8p7UJTv1ue.u1NgxH, );Ntwm6w׋q8B'ey㈊Ʋ = kkBpE9p˒L ~@ eU0rmiVZ3ceZsncq΅e\Ꮖa=;ۦig=KXisΏS ڰ0,.G=WE:&> :6+"G@h~8f5kte헽uCsa~[ff>U\x޾SzoO:]!r/sx-˄pQHqO=sfĉ'vΞup6ߊ;94$XZ"-҆&bequؿ^8&GGGGwm6[8~gju=׫,cgI_NC'߶X{w"t [stQ#_8 $,5\T3|& '~W")]wzNݹ4^OJuۉHńp]DdXH9ۺF[5vENu5.+;I&AkLCc k1-H,'Mؑeϕ2I2I ՎL[1_VrA (G#uC:Y>lbboGt_2N8\6~P#MS" v5mzI'vg:<9È8e[[ڕA&.ӗ M Af*"mOcH:=U(Hpx6u|=[1ÏReU/0hz1 M&Ýi ijpqxad_?:st's*|wKk7n9}]}=OlNMgiS2{½/uqnX\@y§] & Fi`#\lNon1M=2\l`ZuRI _E)]eY^i3UӰLrbkI-Ha˃\Y&AQx2(ĉ6s#s^pAmZHPJ- a[&1Ц6qb)2|IAm0Ln;>&<'bDTb2)`kʠϸo9HƸIQ2mwd m,7 nUL^;V* k:u._fBc1c(!:Lݽu?_A|2c =yƻÁ#8w ]]/8p9ΥKAGp7?v\81}.?ynߞa@V*Ǫq`KFsxis8)4 8D*ҿy^ c؆0ΩܱtQ((Gv"q`<@%~Uᨚk>k &N3{Fl1Fs^vR3bpQLN(:#9lf+3-#oxK1j)SX]E0ȁ0n9u|Y>2FdJkOT(ג)ܽ*{3؉>߼[ !sB`=qt31!Ioqx yv$cSY) Fw.A'IB`𜄐`nc# ^BHrH?t7qPM%*QAUVszI?ۂd`#վ;::ˇ:m޺Wp(*UJ'~`Q$ѠL"p77 b_}}WOetf|މ#Ww$'?1Υ ^nYq i߁Hz B66O=;X/|Dk8BMgQ(/~OWG}ع>ɧ W\GҹT$rRVn3J ۍ#j ӊd3ok-HlN"ӌc쭸4إ'S$i }׳m@3 Cz7ÿ VGX82 5QzRUC~8QkuУMT_%ꈥVԦE@Q[a~幦:gH Nkbp\W D %{I/*.qY-={t+f?>2ֺ}fGG!W凡dFC?˃Я<W4) 7x; #)4Xxa}/"GR$<_"`ϯ?M.Bυa m(:yՋ%^rMtt #>oY*hņZ" W[6Y[UU-BgPZ/B|'fv=˿1'ىt_=:͠U^0<5­p/ CcU;I:QUUwNCJ¡ˊY*4MrU% Fn" _BFI1ap 1( #0sCލO>]W쯮"!C.:hF$1ËB]ދ{q X:߅k"@O"Di,I]gSC^q)ZN{ӝam7iH8Wf.I$nwCQ處w] a7v,oьmjDm eUfzB;pTJϺP}sʕ8nڦj9Yh~K벨RL=òo<5uw~w|D'G}D-HF8"wޅ[ec>]zAv˖+0aPƳDԋ`f ?15o;'qyFm9ݓV ȰZ=*dUg4rgRדɩ%4qq-bs 8&r:$LKkɩ>] ܪ=x :_U轉2ϵKi:K3j Da\= f:5r40 }y^=w >#]]DuGI#S{O==̕\Oa<~lOe](6,45(`O 4ZYUa< =i>eVh*Iʪÿt+M%7!v&/M}UCSGdl$ف7꿻r06A6|!n&h~ 6:~ ܵn&!?M|A!suLgmҮԓJT'Ud5i~6짚uLWÀiޝt)#W|R, =L%:X4Xt3t*kP*1l+>w=Ϸl&cA .N;-!o)*c|T=~\\M5!-4M;CĽ3oÜ?,(-0͕=v4ggg1&|$GKv HLQK 뉿!V8Ml3Vs!\dAB״p^d10y[#|'Mr+zܘB3M \8БIDH0 .B՘RM~ї)a4;rϲZ`of3zc~ f>%˹( $s,7'D +`0W}p$I='=_M'X|~B'$)qȫ;vx 7EQd*vOWTkM?11'(50$% O,ZveÇUIV˯ˎ4mCe`% PӚ2sk*9wS*:\4Ar޽뗿c|]-*$TFv#Y`@ҧ8|"T7x(;v딿Rv\bɿ(8@H߈̀j=4`YͲxny`Y@N-_U$(YڱOͰ+p0MQ,BUE\@22ƗCu2Qd)i& Y<\]HfJJ5[g8 Lf˲NkFLk8g 3{8L^AK]6ʧs zB, .wr:AOuR OnnZvjz]8)\ OaXB3뾴 _𭲶FpF(Cs).|?g4$m&Q?߆#i&*I5k<}GH5Kq6F/kKSo?sfv Qg{S3cj*qlF`  ųN~"EuvfjҜ Dss0M,Z x8[&cf=k 8;V* u[@;t= ǹ-:$m&^)>LZaoI}m4I0.O[8hL=& W+fSehDћ|&e|KtWy/p"h8%{y|AkvR'}4߯.;q4m&{zt-] 5y+RU:gTu2ew߷]MSUMfaf(BA5W45.~rfOkqhg9NpkncNT)Y :=_oV)݈PmWIROٰEfqnqC2?1^4[).τJUz|r 8GlqCnW*36_Tx" zW_JeťmCh6;FL@"CoCE/Qġ@xLnON r ⹳ׄd88-8Yi`Z-/vFF}u4Fnpt⨬uc i,yZI:|ӯF_l|a߳p0:YZq=*j$ yAM$k ޏ-vM_ktx [e@^+0`[KGSCxD{qWu>LLqF%e3pv+oqgI3FaGtIB/夜"5'/;:-ƁQ3~^ޒ(~6QTe+ntm૳#6x5Tk-r)#eIa7#i̛و0;3j:c7I?mZ??nalhY]WiQ=adXX=ͯoą9Xk:z 0 ` ;vfTsV[#?ͬ.ι55FJ{uRt22 x؞M#Smpp3]^^f2f@otPoEii5-bYP22`h7‡>׹\h䍂!4C ckZP~4ML/kphBK:ÆJR84dKu}^7 'uS-H>AooCJoZ3. {_$U Wa#>d% ~>b ]Q@1tmd90W#~Ü놡\auQIEJ*#?ܗ1?s 1"bRfFJtݜlHW%:4`- jHq;L4SVĪrvM5Hm9{^]s}M5*]mK _?~E@Fh:Ns莜cA ;v%(FhBK]Ia3дQt| A1ΝU@9/i!"jzlEK{EYM9+ ڪfѪFKA/IžzP[PB^ftwNr<Ԁ0x7鲎a܎}9,~tt^Ts,Z 8|F=n Kz4Jf>_ٓs`!h߫az#43d]I)udo]\V 3MOY:SN-S 6)`McdqYZZw=蛬kf}Ԡakq\Ճ2\[v^A\hK5 k2qIM }IeufFe%UQA @JUBmm QH@.49ZeW_Xx .n;}%GHRD!i&$}At]? 2a07 Pur~{-/9Ia &xZX PjK&H9mPIZD[#Fh;:oFgt㎺CSh?8;07ʼ Pn0/)&z@8}ÇF\ҊaE3fpZ/X6?_361!P\슝q|n"tR9,evwbw%Ҁgs^Em؄-?w@IH$_'AXmGS Ɏm7},,a;nR{,Sd;cQHBUQ96Q5Zv~{;,q^`)!i;(=oj5}9XFOGsTx 1j-£< ʦ浟:k`k%rHÄGAsoc\8sfm7t:[ʺmbJ9BFTMI3.+^%?qbT`]P+`ۅ 󡝏JU] ]Ȼo[/x{Uik5gWFMF;:z!]'qD<vSGX&ue!x_'MUY 1'qtTǻ :-1sn}h:r11`UoZ 6OnV:vm?& #hVCUzbqUZSbKu835'w=4HI\d2U,¡z!(WTmY]DKh' ݉E^H6Ksؒ:a4~ݫ* aۘ8puLV_V+9 8px7\X(>>HB֋p#|]W `m!Y%dfҊseMsIFHFjeɂdK"!.S8U!YFF,k0sW u*tΝe,՘3탳fPԒ"ӤL%g;?hKƅ[/U'w Kjul !:%0dH YǣX\'FMJݳ>AyF|1'ι 3=(:3}MR]7 h>L熦P*2zk&~ӟĽ]:["(n%jm۵NkJ"jcE`ȸqF0{3}&c{MƛH tICgl΋Uƀ@o%KI3ؔ쥮9˱DFEEj.m9+ zj kWH* mI, mdN;у1 Ɉ_4p jǨVusC9*2D 7z=")@W$c|ƃ>G5OD/(ƭ /z=Su8>^Q0*+ o90s$%<.jE/I). @8^L-m{:C <\3ݼcg#ES_Oj5uZ-zmuF1]Iqcaantqz٬]g;ց_>;!:p@U/"9% yvG06G}f`hYE=ڝrZ1?h !VtF;i-fʭj R j0LzN r]Jd?ں$71h>_0:djMPzڢ hl}I  xr jPU;zZA6gBRdx,W:Dn_%*A*9{,&IZA {=/DxLc",m!:2vm q-kB[~wPnh1k~%&QRTҀ0 삀a3 ޯQBY6em԰1(S}nm̤\8BcV%_G>jjIJ?,b`BߡӦp-z}zܼfHjPhfg+rP>8Χ1_.<)xL-g{$+k08d+A4O2nۛE/58;ZwPr8cwۆ%RMӴ2ӥ.0.;q7aEp]h/`T1yWJxb`$"ʺ\̖:_\ `8.1o.zU^3X}SJ2F(_|r{̸aD۲ǏU4ؗz6nQ9OP tPPiA3_,J 0@hZCrR*JO8tnJԴm܉5$#5UV6p )Li!Nt/39߹s*0jk֧Z. dbxw\a3?8&67'i94w-0ܕQczE9+B\7%ց!t\w]8GLz`'ɘ֋0oXfRLwGrF`k#/(yYQR$jUr>/%k/[@X B<» Ŝ^jYSOsBx/3sՊOGsheh ݒht|zj6;i[Q"vfaCK4fr|$HX9w#E#g6%?^oFe>_i;NqBWDU קk_\z&8x]Lx^e~ӱ%#rz? >uUI_#MP~4WVVV#sI8ӧqڿ±zxA7J!tLSHcL jYρ\n{3 1΃ B<hF FyZcZ*b0rqOSzqO:Σ;#hdi<6#qɗI{+s֖Bipjji}Ck K/}]g/DӋNPrk)AiiHðl"|Ҙz$ǟg쓚Jgƌk{?i(ڴQZֶaYѶ'C4VVޅ@up)6G&Cjk#JŚ a,Ɋ eij'm-@kkkj[j*qxrj\\wg(-ps W#PP:D)=lS W/ێFZkr])  "ӗIxa,k807f똪&chIFce#@!9Kz#XYυݔS (:'Wok}5?:Ko֍wz@ʎi&vH2Rwu#)Bk_G$(ǁ!s@A{T[֣ͩPIoNAcoiBdK4edt`۰u}AgƓS7[A ^^'u;uIU 39)C ՅvY)ϑX5VC']tkQ鐑v4@=vb uG#k{,gmZusw#wҸg{VHȈ,3~xmnˍcM[%Mml{=2BE49kB#X=EM[лq$mЛtISTŚ\f.&jkLEIӯ^ agnoseTgT+Jg~RrҬ0JY}jISLߔ aۣa a^ۻAPI*5F)4h.x8c59c(̚:oB V[yTg:^o![1E',IU`8n"6Pa@$bP8&$-hCOuMqR4՜:Pdyc( !Ac/lzn}:%a7jљaa΀moHΌ*"iGz/1&L|t!ZkA 勽Z;A 4X:x ũ0Z$' *suRhz=%Y|i-P ?+*aO]xާ@ Bg$"6niƺSS(`\T&*KGoUFKkY"ۥJ7 6jvE0?zj5Ӝ֕ܜq@&Qq$`h?Frƞ`!! NF 1'`n9b{Q#G<7SI/eIQlqf[XGn&ٌӪe9s5[6^0یsfBQlʒ!zŝZڐgMٖ侷TUR~7_]ʖr SjZnC2Ͱ큯R[&cda CL. sƛ`F d.]5!#7Ŵ\?a+nnkZ 7݃R&cm|zF2.JFS'd7)fn, A]! I[#L%;&qj&6cR3t'$StF6Y7Me*< Gy6;ledGF4AӴM]-I9&[㭯B }} -ڭP%SGiƥ:DxJcʎi;tf6XO='5S4-[.08 |Gr50v)],cl0.ˊjH2`8: Lu;O]lwG% LK`ҦD11$dc$@ \ʹ3( UIeE2`PTS]*o yah *3TEREUUPRh:F7!`u83n"w3 O$Ja% /,X}ܮ@C_!V{xiEy #yҲ,off1TQEǁssIJиc_3^ ABKpsPk[2m͹}+=LӾ!sqzl{m''ź 6TqeݲphZP[{.@B7B?a )kRZ eYQ4006}Q.7\85媆d|sf\1 h,DdmtV =qH1Z4š]h &5-lEܑW?z /b+1G03—K ɭkMۇ"-*ۊA*s=)N!arhK<!%N=8A(OzBBBpzB^ϴmsEӶ͞jYkwa4TGj 0|uPhRRwM хXeTF`;$Bz@M0ע^P$m ºU4gZ&qS-vi4n[G ۇ)oWkY9{psͼCAXߐŃsrwzm͘FN{z7BXc|A&IbPqdėkj& DcduH@WV&~,$I0 "EbIR2ER $HLJ,/K{ *0,笃EMd!TM2EQĘ?xm=wܷoz a,+bej6X7eR`4dM,F)Ht/_\.'T UkQ:c]\h;=0ϑ%Ș &Az,6x&^wⴙe$9=LzlAPXw믿~9B9GMIFMi i".Wa.}TZI|&f܈Hymo&`uajR6L^i6pX51J Pźn{W{GOעEhMH,˙CA*Jxд|} }xaƑЪ&]_v)j/X;CLwaM|4Y#=pajGȉX q aB6˕:mH]-m r271o92]9^xn YS^h>:;sYp}h.7/XЧUEx9CA_$A?Ζ `L|?l+%v=J pZnOp%>l:P;:[VeqkQNӰrf aI"oSSz;cQ)4Ę?x)HtR'nw%xnnuUS?%A8뫌M:c坌 K%KP,Nh THXE:\iU]dLK;tݖū@ң+w-\g*:TWæsu$`2iYQ?6HF5G8 5sV2t7ĵ*uU:.HU)MZ¢kiî[  vXc;NP!-⸚\D3vDW*yR7 O)j(3H46(gzOM|3}BRЕ<=P~:RVD]#.v(ԃgMw~=" vTRZo)Ѭ*}MSk^&bR/{Ϡ8=>i#EɛYd#8^ N9̲[&@0[6tr'XB]d$x43-(]jអS1& HxէƢ(:0WXXɏNGG\f/4݇ކP:N prLU` oͤI$v7 hD vT7s+xf:ݠd"IMv1RBh5]SQ(OOǮsFm[8 FmTS*~X=nzPPz08g3 B$̃dɲ,[M]"0#xCs!_VbM;%x@ Vsa M{l/fKҡNd+ʣo~ .lϳ˕O*Sk2>oUC_ꝣ\{P0yt>9]B zenGףwO`O% 0+"IbQ>Bwwfr#p%ZLZYcK>pM1@8T^ &(]z=9v`tnt;BZu. Y$k⢞5bɞ8BIDlZsH4URṦnUuϓv]0|O/g#, -npeB ww;,azvO]sFCg=!l; `9:/kb=N`\TE'?ù&Qs^̿Gޕ- z-Dx_s-&o`4u)c9 rn*nڬ~aapapЗmPAmx+qV4v" "etYmThUQ:wdG0y$LPu NG̮6m6aJhA%t|hҸAuaaEac].Uf)q;dVjԁƖ"% qןONƀOGDRutw,~V"z=p={$wlOGE|LZGvˮAU4mN/qEh=CGvvR&38E*LmKЎ_$L4Eǁvt43Nt?w8i@KLCD-q;DQSt{rC?-&)Xy0}0ZSw#,;no$+BԇS[]Jv/,EIn4?oS[]>g!sl,K.=u vMEUW#TG- /vB#-J=#e)m%1)oIauQL(N#t되$HR'EF5?T\%:aLQmOFQTE3z/u{% J^v&29l}? /ڎVэ{H5Gij3#jVckRr)U5q8H&5MaO[\I6oKs|HF7HU+ȐǀiBnqԋm۽L`ߊ-T+Aj±>}VHMƕ;p Aw}:Q  BrF$`Qڕ90|C|?pz) CtK^d ɢٓUMmyHҘ:)c !y6EA߉0kJ[8n rxFe-ZyN0[j3`i'\k,PYqƒxԎN-0jYGl!n S"Pu/ft:pʭj_\Dĸ<VgI(15 rj~8~ rS"ےfLLI<ɘM&z{* [ZKa:<5P"PA@uRYDG(n.u:G EҨ͘MxNiKmf `u pz} 2X^<sb1~a ΅aĜG2.teD#[HyrKWχ /ꁵpp fP8Vg7z`Mx`o/>p09窶.nW S8N8OI-9VaJK1ϢIY/BfǷ$0_ uuu' j5߾%rιvJ8EGC86Fezt\A1>Zn,j^0j EۚH ~(/^c' ~`B6C/]g%RKٓTd'th́KܫX['tǝq$1vl٠ 5œXyYoI40IRuurm#xnmmHIzGq20yiv^AG|=\7YwzMi85ٳP8k~F([ ~xXHV _V"F/z\viBPʹYRJyzA+W3).EWk]蝯lXC$?ΨxJ7XMi;Iщ}4cB?q^]ʺN$Njj&-͎{kkKkk(`L Vq  QxCZ *Œ^mcqstZ#TU &QĐj3[w"nJn/Me.WުJu\ӠOK7S3"4p#̃P):#eM_D-4\I\ޅ᎒ Io==3lkR^HxJ aH"(IMӴ=3LѴ(0!(#{axk5ѕRьdJ@5È)~eZ:Y8afK\l-uwD@3IM>VՈB.[ĖIKFMS qMU M2hT&ۻwńI/bxcnfމUa +m ӱ)ipÇ}Fܕ00s|_RIB]IqU @ -Y TӵYcw ki^@/q19ʄo;FUcgiFձ \!(B[Aqt-z%z:6%E>뽠Jmͥ,\[+8xLsL Lǫ&YYm7ZZܲbO}͟nUKgMlI[eK8:hJ\`x$Kսt M1Vӄ2cua% ^&ǗHwMF;`,I9N*G熢m(ɤN6^.n%A܈tkⱩ8|6O뾱{ׁU!|}Kg >nzi`pO@dBBnkL}@Fvɉ[2tEwנZ?38jxBVZK)!ݿuQPڃO~8{>bÁ Nt]Fѯ}/0w&Y+P0GNp 'P}ۚ7cѿ=}}M R*TXǃyJuF&];}ֹ^;uj& 0OMlk! ߌ㘳>svcr1{8>,GOZSKKK33,_mCGoRiHAT8"4q̈́_еgf7B3Y7&f ľ[Yҥ[)3 p/>la(L>WrKjSSf(a95UfԤP~~ᜋeӿ,dWGr\ڸQ?@) C)،AXl+fDww0e jݱT}lSSסPLnIONVs(]j&{B1AZþuB7E?"a`rMfAm_ :/l uvƝ|!?dwVJWzlwyNm%zsW֮[zuےq EQ%Lgu.:lpx:^!`Ѥi No[;5նͦHV LFW)QNDCrv}p[#{!f7R0&Y'AA% j0(yV06d(@Z%5,!ݫ_%WfGr! >G% o)xf3>~Im?'V%m+Gw@tt`'N0=cћ28C)zuĄΨ5Lv"h' |hXj kaSN@Zp1KڠP'_[4Ųz6`;cQˏh 4f[m (Xkquq֭<(ӛ9`xQ{iUwHM/g5+*}OfSցN')96˰ٺ]pތ  PRp B* viXN`Òrݞu3 p@,fWAIcr^}[7T,NjZ-u(rhJGs~\Tc2!T. -akkk%R۶Ϫ|/~_w.t݂Ao>Oa3+tCcgZR\Ŏl>~GzUpC҈k=|.n1+LoH]!ʭXedQ[jozKv+$ϖ18~oQ*28[l6EeosG%FDo_z?vRt̃2 pLfjG]c`H.O]wImqeN&Ez4,Gįr>3_(L|b^*:,Ѩ'%aZZh;:nF(NKh` q1- ô^l/_Ѕ4MkFF>۽fo:II1q!EQ.3ޠ(5aZ6dϓQCDFƼKr ۼl;]^%Wmp~a wcFGP1U0`tY3zV#Y ՀDp›jt8V B6Iz}Z㋾QW~pA)oKRhsa.$|{g$ b( À@a^lK͹%K6U{8 wd}m9٬&R Lndh>4h04}97h2Ynۡop%'7Gs$kHJ]C_ɀpbj7`TT7ڥN@=#T.&smQ)ɶBwU(z`C1V^۸(a0%a̰ג e?]h~XۍPj_Lm3>."fHP?Am2' j.Ru\cFZbwU+9MĜw(\9j.ss`nKZ2 mb5)5]׮UJ'`ܰ_ ȨX)D^a%;Z&1xR. \踮S kŭb?Wh|:gx?چEG0Z7/)i&kLa\ۖ>?[e*;sT\/}irO] z8q?fkkc"9%\ε,7 =Ӕq/B/u*Dy2guS~J$C|;m_sWС9 I0M{X`3NUe=~h)OJo{;/Q~?ޗl̨s/T;qBCFPunnvf\ 0iI$e)jV  :!HZժt]|#x^{r!,K_1'u˲҂ 2ڢmg.e| ێɹЩGhUToqK%sTr `y"mo2FW$]/̺ 0f>Ytj5iH<Ҙq4P܇KóD閣Q >0!3I7k,c 66I"UC!E͓'CU%1VބCeo>* ]8EIb~2uTph%G辰I |Cg2ar$4Uw +U5 TUN%,sͅ~nS>@b|]?L`Lٌޣ՜m*&;)ʪB\;v'ʜA7^% ݃A(k qu'x|cT,x,n8 tyZFTGE0_%T_ٳښ%щ923x2PjF²t+6~3²kfJ[LX2Z² N9=7oE&.'!Z:=cchvj+ol/~"bpuJ6"AB!҉Ba80:BgB` >vvkb뵫 J(8$&bHŒlS'vYp7O\ROo>dwskX0c`xH%ԁƾv#<!PdΖXzD았n"N#Pjik0K|/h' z݀xRD7dl79N3nh@_*7wEѮfyIYl1ϥq/=٬6z} $4Si']$idy:>?Iav*i_1\mY]|$a[l.p Q"Sww 1@5Y `kVlVJa:q-lO32QE-q(w &'!\)4m3F`CgϞ ?Pa9Vχcyɵɢ0Fwy|m' pϗ[zwwKR:!uC#ڤ|S:[@ף_a ut0m/?6rٱm\vnö+zRLJw5tXއ*!wzxxCEU Tcl0 jOv>9nY/Gg&j9GxVXAm\$]?_[쎝|G;w]/wVq{#ijޱZpLa͌T;)CZJqJ0vKfMo(c6 q4z]vY4X`{7(v-7syx[F Ç# k+j!vq$#E0Z^-4ѵD &$&؋OTVr_*]ysnYd**,8S* l^E:_˲=Gc.,قRƴt $:.ܫ67 n;Dy4D~FM8No1UIcHWeR4-+_XThEE) _N9Mko`3+RLK>۔"\q! :ڎNS`|C4=h"E8bVT()w=1⼱R]2vvyPϕ:R\T [%W9t7h>mN&0n`֐ɞPFE!q!ř"+#*n֋ݺ r}3Ճ٥7{cn*p+ry/ssWZ3 tퟛcoK~;`}s;.mVƩ0HU딊SO=b2PoY#{c۹!Y[(Ar0mٶ_nHnx.$:ۂ^U-$os 4վpj:võ+||8 7"8 ~ Kn3͐w}֋<|k~ si]ЏFatj.~[6л:u&s7:Kn Q!oF.Y׍ZUį뮹%🧞AgriL毭)$|EUJc!+7N(:)^Xrg {t׈6r uσ @Ln&]z<7eYްUW_џM1$j'O IvAs>J3ԎU"-0T;<|= Dt9JcaHr4IH3#o%L۱l&}>==XV>- @8NT^ʵ?L4*q=qr2|:j:ҥػ>N ݣ '" ?.i7# 6ٕ`O`CHlC5;˒ &,[j&lUs!obg^e[߄Ȫ֞|neiY\x18x)tΈjuNVӱBHoC8W z>v f֣FS*l[UF=M{( hd$!7eRwu/Ax岸03S_-t\aYWtBxl& O0k2!خ>7#VCK_" 㧹IyOoΊH3rb.pLfia/8^n oLX+ٛV MaЗ'f&튥Dk-1yأ Bg aUjB8FƊcJ5 3{}ڪ|m!)z^lI8Tõ~_c.K=\L2{&=rMr3Qkwpap|8I, fvˡfs{.tu,}S7|…_P 3&1*{)e T۾]S๵Ch$h4=S7l5򉮨z]~$4J]|)2vU>04S=:D&6 U`g8SwB֒lU |0.$Dݵ94#Zև+VZxHСx{ #E?0 Lݏq2Y 0y뭷0\B@6 ڿ-htm!΂w0ViڣZO{ 6#/!ϣm7fy?mWG6-A:Y-e5WQr}EpK60ah kx9|[b~HFbkU[QbC+(|Jlm$Z왯xFE ݁E#T8Mp(;(:*t|OMt{iat+s(nu(|e; sW!{}:8t8>6WAgeVh#7m4=GtPj8c|1 58[ )Eǁu`bi/*(, Yj PLk2;4_ y"4rE5O:6a,ƔDGr_s !ͮ+]_@x*[V^__I^g5.,^eB}E^0 kpt2ugh?:nDDEϠ_G_@#{hl(Ek+lG;ҎMr=C\F}QgcZ3Cp4,;d¬AVyn eh*?^/fsc ^N>r:l-)C4lЪl%\ȱMt=j0(x ;Sdӣip4}oL@7ɵ,lQ-X^ 42]5sz_= x4Rsv륶,grҌW=T/L7 5t53d#Fr4zpӖ̩BcP~*fc2݅mQj.Slʿވ~(8PD(l23W9L=@wl봏mP} t_{x~4h4F8]("2,A9C>;뉟Tri~P+{Q\:L5IUCH|%8"0ԲtXdI Bbf5GW`@FY-?mSZݱjZB3vyGxK 0PiOM1zHѴ MU*+:)Y#~5)"ET:b4%K=CqlFq<8r7^^Dn@ ؍ٜk6;).WN0 kV&[ (z36q⧡l.=,22*! f`P!痆ҍ)) ]jP)$䐬~/6CE(M3 an㊿;vl叔u_)5.sK8P6xRmPr1x M7ԛzh߲vlXῬճxNtZO*  v+nͱ_4"{'^O8'2c?`Z9>mlnjZqa,s^Z{?TӣVo6fĒ:I4J$ d$kacJ5 hA +]Ž) qf5Ҧ_c7ei̘qM$ư!͑LR^.;>3DdX("$?8rPj:݂Aס- p(sdX0iqP::C?^=;~4P'KMv;K`O]P,Lk:yEK J˶Q5/WQcm h>sذޛd4d{(3SL׋Q܃g+|cy ;?z f2K<)ITma1Q-S9a~s1O|Ei.~̥Ȭ܆\ZtG?¥[pɆΠxDcɋxE<ލ>- A@ ) 'y7'K[LΛd¿up18&/>@lԤ9zS[en{5a(%ZւC*Qb9De7EXZ{;_w_N"IY "/J_&$+*h.CV쌡yZ~zB;~y׮]"tbNc+y>mkh7:΢a8! t avvrCweNYj9$iHjTf0T"Qw^~lKc@g.tqDzN15~(24s35xCu\]o&ga? q n$L$}xiMZv~*IA{ &J2 F 3(>+JHtq< 8(7z76_e*dI%/O\cfZ \f=[,W!`AX]} b0y7Ӵ)-p 'fG'ɹMơ8֝6NW]&tɡaLs'41DzzgΜɰ(%+F+?0V\9<-'e8C̏fл9x*弊´,o >aOe%G#:%Jz^jM2Yz )q;B/8:n:(r 1M$IZOrRk%[QR׽=^87r:[Qv\rG9=Ei|w_"+6<@&G/ 9!t؀Hq)KܷcrXQ䦴Hyn"8g@!+w&_ضmeGgz*k>mV@&rbZ9DC( V<;mmĒgZ8҂fIP[7˦ sMMH\Zl֛?DNl#?^y; b{#C*/zFQsG !t\Ku}BG&(K#K k`ApKrma#_*)m_ƢRyYZ(PZ~(^srx@Ͼj$]zs 3C1v!;e~ҵ/8SͻuV3;Ac2@y\yޠww½c=so!F}E-I;Hi_aºU'Eܱ<ɛ?"9T7:V>_|P7hDmsQFUgyLOu6o ajXGS M >~6-#8@S,-$kr3N>?9aQstȝҀ@!o,4镔 ƱDZ"wh[sv ]mo},Ё I"`k^ s̝LsoSch`ooG+q<#}[}rIչlo$ |NeyB&^ߴz2·4p]rʟv*%g[^F ~`lWwYUi+[V 7Cg|"/l&n ٫}/ޅJzs @Ntɮ$Gd 64\C_vH Dr%b ro3X Bk[ZZVbu`yeů `hD5Z'Vk"GaOl ۷ofX2.[\p-u _T Arah9`;:*hS5~;B"c$N 3B b|9t?ws&`w?gqzy n'?Դ)q C)Wgd?`VM0nk9}i6g?JO~WLi"@ *o%$PDw]_R[@g<&&Hr0kp5jwgL {C|) Mt &2fD&$|ʲi&=:x _p4~W_}ʹ_W5M} `=YyLX&l.Q*J9kK,+L66Jg TFsxMk˭ `N3SN¬"˗ ^ e){NYYwGvHX4[5ydm(b ^>Jd wb Mqa\% սWXX=*<4(LJ*Pt-ōd V3 >ДrΗ4ИRٶ}?>"}A"x#Z-_qB:RzhFтgjz<5lg(Wxc*^QN}uWO{oi o'~V{ҭȇTYUHW/2Hu,ٍ֐BoםY/j,ټ=]; ?qnQKr֯ے%2ub~Wnޮf-{P*9{r4K,/0D<ڎ:z =m @9Ʊz}\Ir1 rr&~VUf]5fV|Äp'|&6, 5@:zBUDmY(IēzCtbbK=ghVJ!s nfvoIܙ-n Xٗq s_E8uB-̉}'ks~Ζ%A؝EtP[t25ck{gSLJ3/ ݌ Jf.IN)nc*io/wB)撷B}(;3b&~]ןտd x&^t݇bHLTs]Yt{jdm:㳽) y^1IDsKcIAQQT$LnNHWdsav}xsRՖ*Q"R>'2Yj(*6_%\ۀS('`b"v̎p[$[(/pO 6JJ{#GQ9^=T՝#]y*Iĩ> J{"C>t ;%zֲ"ڍA#lvdKNG oB(Ł "BP8:{/trB"Jskkkk?1R21x/N҃3Ouk0'Ҷ;ykTee)q8ۮ4u?:znG}"3=hFdBwr }IJ Ay~;<9OEͲ|OlКTv+ļ%+ϫ((Ҥ4eRRtJW:} sRڕ'XYU?g{eﬤ\q|1b2ɘS[s;IGIoyp İ 2V^.˕bS&׺OΨ}̞JhOsSvrV!I]? /+/!hnݹQ=u$mE"[[UҖK$7NZ9^6rZO1=[m/GC.˛-zVf5v_zA4 ?giy/b-nB(>3Zġ0L;띹/Og㖊nVb`NJ,Oʃ º얒뀛-'7%̦uii}wq0N`,-Cz G'l49q40ظWU$Y92+ˠdA9@w&VGzx{bdI Kg$ @H&}՞Ai+%Ê-v#KHM[QQxrō=0Sr;"h؉B\oF`U`hj;PgH>֪ogmC@n.7]7p5^?SrP~ Zr[v u%M'D 2]}[Nџ9_|=3,3[Y:L,7c[b`12|" fڤR5BqtuY֏jsZ޲TF(ɥy|,ģ:RF8rRmc=rVh!r:iǣ`0g.o#@OXA`@AF"D;S$7zk:2^/RNq"MStTSoeR 9̞cU*c>ro> 60f68O⪤{vu_ͤf9l0q2%ݤ+7k] W87(( ol;?a'YsS_>YG?*(.o6ǚg|0ŕE(ʸ%Ǎ=k#IBØKB/s(SN=3Ir9mȓ E}tOjts@Vڜ8Ni?"0 ju3"סƄd$K0L$%h& 1䲬.B蛺`W@J]]e><}{UenՂ16577'|MUY1ΈRpx_T*u:Skfs_5?a gw`&p[=SCPjA:y^%J©8`v 4&6LjD 23|q=37t^.+r)c칉b>3MO7tñ5 [ޛibp=c!$׷B}zf}bھ W(nQpzѠgF mO{m},uvXhvZ{f"ٮC!<=U T(O5$q2t% k(0W?{bp~_(߁G1rBw쩆lT'GV-Zφ:q~Nδ M%kUh\V 0Ԥ@޺1{Zw㟭P. w\ОȸqrR"MQJh5.|P(I^g  wV5_Jpu- dVj}pvI3d;0(qr}$8nBx!7>&+F:]8NoiA)|_p7էuֶ}mRiqٷsd o{8ARUp/(%Z&v!MzM?lyQ u %@b+K|IEKyDf]Kyw] ?L>K8M<$܅r`?;e1dk 0)&0DhY, 8v`A.wZGh~-X|NQ.5FkdF74<.|`[80Rϣ6M=km*]܌Q,AqWHƽHJԱ\=8ibyy9[ټM{9 QG_U yXR4oȉs4bn.fFФw^̕=TCm<>,mQgzY̍BĐпfK%Atjj옎-{|.JqA%:Ys*zH3g8TM(R p9N<GbhҜ B7Nyq? /7Q͠Vy'9jIc=&HcLb 4B[^B9S_zL_8++ j'6b(:QAuap.un mY賨@Mnߤy l Qq[jɡ۷A!ES7+sp=7.%}*yxZQQl̀f۲$5:9"*a _htҢ5><ϗXoom7+ :\JwhzRNUR-vؚo¢uACǙk eBv9 z^J忿 592khѩQYQbٽ&`ؑ׺yf2dKlo4V>FK)g_\[ ke!x/usj8 Yi=xS6W)Nf5.䫮 pn3m.O_/ł*8qlzŻu$]!&)"ՑiR(Cr*~z˲DH-UHO̾9-dKx'?®}B4Ib4ڥbRWvq;Fm) qdoss-͍ /)O,'~IW]՟pő9rD9p'37ػL4fߍn u׶VX+,֬9\՜zߋرUP:zyKѬj +ՠk]iv ^o!=bv~'Z 90fگMB-=cւn0tN#_(MTLk 1nEQRZ{1S8ðX0Gmm<԰@6V-j"6܂.34c`^ 4sކB3x̶,)wPуOqŭt9Sw*\G ^&X@-gŨn)! 6Mp^}m/bzCx}}->J<^z7ydy72ʣr p ߍ22XE)TJ\ 5ͳ2AofEO.zI)'e$ Ɇr>jF &8$f c#@`4`0 ѽ Pb|C|~ed;mm'\Y;>ٵ[Tӂ83gzgΜ9sie\\y/^Hg5}ԍYs{ kdS5E0~|{8vIųvݴn#oZ7G}¾ï􂍈K(>cB# J)$MMMԵ_~F;ăaE˨#{*[%ZvlcڭI#_CΪEdNmR_ll_0F6ŧgE3]Pm0/4nDЭ1KQLeL&^/t)ƦY=6[Oki&vo6bݪ04^x)t6 s>7HjDH@ Ŏ/lRTxUo$);vH'!E_FkSOi|!̷$C<:ێ=?P6rDl" %%nlԓvm)?2D3D/-. 2O 299s5*PM<%@< Yd otxc;anHˑ+Vi@ fV ~#1p#__N+>H77xlY[IfehR@QrAʗG唾:cxw>Cf+gxG 5օŹ) ktJ>s'Y@]vamk ^!5,u#ug~Xj%&7,:< Q8K~?Um74iJc)LNcNXq+GGo#ӻ|WpxE4 ;`k'eԹ^IFLE^&祒/Ʋ1S&j\)\| B;ubPɟB/W U7NSWO"x߈qŦSH̝[2ncNtBiIyv' <>F$q}?UeqګިRUSNt^3Dwcj4^[tzN%}3E.z!Z&M`iMv#[^|tlq1u * )y֓ }f0.p"c:vq8i19N:xT7FP0뮋q1TıvvR: :J`,&u T&O#u,[=p0ͤ3z  &zCC4Œ(,L, Z8Ehjv5AyOAW(Z' :1ϯ|]`U0ҕDV8n/nͦ+? ޏRuX=R2lsqu:Tt̝D2d0) ՘Bx9{0n]>dPbnLo*ZSaa *ChP4Hѩ/:@/.9JZ{T_ m]gs\nVWu{WŶmb`aL^A& jX[۱2QiWVazlFsEeZ\E; t*,vssrՈffI.V'C"[C5l'6y#\ 7[9~krqAQ>6'+6Χ?-Feu=A numZ;F_Bk -֩"NWMb~f0ہYjٙiH6*)3wxy+^6Raol >I616$>貯28Pq|I:,q T"op>޴ yڴgUA(e0x' m?`ΦU~~M|yLPW yq*GzxڗLJa LA>?d4'OƜ' :ἽqH7O{smm0,k}'oϜO,'z^4Wȳ 0}ZO$ ؀@1`X&[Ot&G):×x7 0FE ]\?"I[*JtrҫoLsogK@[[a}Z{⪽L6Q=x9:ig;H?c?N>+s&9ZE$ d 몦) 1TƺqMi]b6zHW@.DagWҦ |m(S"A:|YWM5yYaUzU/uEbi>|4_5myejǘ"<= ژL}s=_7ݨӹ4%u\TGzl։rq!o^V`HAoǖYU}-x_(x 4z2QT(UMjiTUN n#qhoP‘x ^&X$l0mo=&<LNRá ι1Uγ؉d&˅=؍v:7l(B6xoyձn{xD*Q'2=$Ob=H.rzIhil f]u%pJ0d=;^2^qLaֺ PP-S=%sĤ T;ƵЇmeljSmGT:_4дlCkCm“>pLr9y;܉ILa`u(ނYc7Kي-r qPr٦hh)&sM &N#rc}"N*Oڷf}[>OPJDž^,*?ÂO3c(T *gѲLV ~P }cN h_ɵj"> dSdZm&_/|a:iX?Fp\7w ;c V]Ѹy":7CVuJ"i;.W퀝C_L gspJVUdk8zhsKVMe y1_ǒb\=Œ1mǰxi羇.5Ǽš2ᆛjr9D,8nPoyw`O}ǧ #ƭ5(ۨqqx]CE#%F8VdOjt©\(ܯlFAV>og/ ޻RgcD"]EN䏡C'/W_CP'?[.~=b8Am'..T3XME-G=#vr&>3Ѳx5!y|Os|g#{ղ&-4z7v kjrlG:0_I1+&X>bPaSQ'F#Nnwά;;c{0˫f#jսmGs{~mYoJVb. !afJva-1PMecqq7vX8PNA8Wbk Z.m}{ڛ B0m0/ Q%#Jf/aV%.0ٛ] PNIKeXTͲT O+j}wT5_ʥu:T~7d;?}SUJza-<ωdRqHGFUoFu\-_Ǯv{&}Eg]K~ ^ Be̩J#mJs20Rթ0T]JD TV"ۦj(62 \p,IͱTO8$u8r9bƒ(< WL*+f،4)-rT\WY6>Ln:=D?rPgHa=^l<=]M0ԃeܘ%˗,׶^&*\FޜcԽ 7G|~Z|'6|*?UtlXbha`C9 #Ё6' r DFEa6,g5;AӤ)˄Ϩ}4}.=#ޏ΢QT*"T!h£ɸzkJu8kW,r×O.r;A (&p"eoxӳUn9| կ@:SKi*c p+rX⃔!5ӭ싍F<ݪ4[<_cCL l5t앴^gKtj_fǠ-Ym}KÎh^/KR"=.iJUavX_DSh\T,fX +Ԗ[ũVk':+(7R!A! ;;TZYX@WgƆá~^$'B֍r4p>lA|+BZݮ*oG1 lANk6xE&zϧ9C#?Q$?)(6 cM o 4@8;/ Q17z6`Sxwy}ZihnD#4!z1XΝ7DQFgn6OnaNc:u\aOt>c)VՈ!`=C,dP%:^bGKYq*C-pH+9f-e!I :¯/@`?+ɑ1~frƝYۖEUSU^jupJ"{"TWGU'g0B&ܑk*{p'$Z+SFeiocӦ&mV05JZd (GzZe%IݮkioM<-QNiB|VW1JE-U&MT1D5z_~ijVKU~A=ڻW,`Bu#I^qJF5uZ/P [0Ą0]*?7P%gɥp` $ͅDŁpT&Qҵ#p쟧ض1_[l%s. bmްmʚiҝiڄK [q̎yбgaa7_~}p6ƻ^q"FNmKD Bʟ= LG9jQXncl~>o]cY*+03=]zmm8!;$5ΰL֮;~SKn E%B:H0F…&<1v b*h: X[Eק0Ts}2$@}f9hp{_K]1 ҿʎ,!V QDv!:4|!8wȥ;|UXrЛ3{_z6UK=hjh6q;^!F0=sMFKq`i1uFN5 32p!DaTgw\^b| r8=7 '{(-/Xa:p>Q#͋i&>qJgΜ378}\nnnR0ME1Mâ=}09s ǝO[th;Bs52N+V;Vf襍PRa#5"`-ۍt`3C oU9llHRy5MMDpXrf˟p)"q2"\.qV*|ܙr) /[YuZӥ{v"JMfF~7Wrt0`4T,oYχyʔfE|7xaKaytm(:YYoalϱ#T@ShV,O%ꗖg4L{VaW{lYRpGZcVDQ`:/MzR&}~666fNFnCPpc;68˜%ťNZ`V4+U㒔VR zzw ҏ1m>fqZHbHH--tYH"/$H>@˽4@%GM lgdc8; v׏ ӇzwG2D=M~Vkvk"gk}s&/uvKYův3G z`+LʛD$Q-,l_=W ڳ/\X%EV*y[>.&` 2כ+;eVm} ]c+͚art sT+*Vr rLMZ'#'nVhիd9 юpcv #?UZXZk9=[gjV5P2^LLC,hgG)^((W*yoTُJm91jHNXP4}[մgqϝ.L@..3_ sGqIpc.}[c%!g0m}}=Ib`֘ ^=̶Q/"|EW̳ z,G)v#炠2?_9GJҹdޤ~jp/|XoȲn6b\e~$* =n'{&υaժm_*.i6S=٬;q0.LrƖ_q h`_nv;t!te|>yFvL ތxA`73\Kާ7 ć#r5mZ^5EPYґ^pVazdgWXϷ k ڧ^tVtc4&Q-73}8it1]w0LMQtTTT 0 =?Ebyñ#ˋ;7E5LE׉:/!!1BWcGS#>_D9\ezug"># mc!`B(瘚D n8 mbѽߔ((CE@xz!MCpf9aGfV&MIA×"`8Fl&Wo_:#dc'n8ij@qgjtvü&q%Ͽ ՑYwo`8w1 0) :5. Ⱥs2?9](:HS98B7ߜ>5l~4g&a8o ,rn!4Adk<5yzO *fm`nOwbY}AajZYn u`KK)E۱qEMw7D4L߰fV.[球7|WL9;3qa} i G/HT$ դ*!38Ns;KCG^(/Zi c*8 L* r}R|8WPU|D߈~l.2^"޵:?F9RLN/xP_5L"} g7ˡ<_2ZI)Dg76JlƝPs$g@ǁml`]oSvD p%j4 @(5^.x%S^~F<~;ovlEܶ-IZ|JiKvvP/UpJk:WUQ:67JJh! I %'twzy1#E(`}`-ܖ䶒E.ћZiGI.AdyUB< 3Nj~JpA .뮭o8 ZA6]5ȃyr:Wsm7B{9@I{9n/7Sσ=:tg.,r)o9׫=3'c>a#UE'mk LnTSlc+X)i&W&@ĝTh#)tOW@Qiȵ][Cc`RᖯG_܆s\*0vGb@ث/t:k?d\0.>ulc/kT<Tͽk{@I&[GX=pI߶Zb4y $}t!|[ IME_aիd2sdЋ ć;O:k^}6weX?յ٢mP 47/>u Ϩij,#K?Vy? EC{y6C3˵ۗ&r県>O#/SUnmbGNqu %MۂQ^:rӑy\SIǎ }_vͥ_]4@Jd>ϳ#xum{? Fݎp:ϵ]o&i4*ebQ*c@URW?leh{D$pSz"p|~L$,thN/|=~hzd2؈1'&*w=z΃_Tw>K- 9eI 9VmXC!߯;'75B,wt~}}sk~ o𧏔 Sg^匾yG[3L]]tS_շx|n0oMg=݅G8&,I*)Sc}_xp4Jұ+ pE?`]0-Yv܎MviXPScNȁLEXDT͵ssR)*irL0YxJyjn &fc{U ~Cz)yRYLXW8Wb*F aFX细?j=(cɼJ,q!P˹㺶i9=;cu0dP,#ba,NfpT4>Mmdb~6P9y3 R=qcYҩ716K$Miz*&:؉Ix֊k.`,;/#{(5Eq+pJK-f4!X"|IWe-CP> \H[nhb qL"%LY[Jن¶5Abʰl4"fN"? 5#k5OPq<`YxW|ޙn qkصtkNOɭ9[O~g*UnsveDtջ%Jh{d@H<ݗ46yePQoeB/JTrT˞!\FokuPo\G8Djt,{"F_O'Nwe_/0(%EC^6 4x׳|Ɏ9XbJW-=3O8ۭ ǵ2l8BE[8'QC ߥ$J&$1"0 #'J |,k.ذxQwgY؅#R_~d |BY?-.G,kу5ŀ#nc8һDt ΝcPwhyTuաoPDriW].o>>j/]F|̩zDF9]B 5ކ>}&-M͛&&#h?RoY3m9ܹ-^k$ݠyhݢ?C| v#nIM$ CZ]ihw_gV[Ii~~rhAbK6LELz˺OnV"Ժq>3vi%D vJDySUM7g˛EXƝVM QQLÎt932 I&QrKH[<>2t)ƙa|t"[bZV3!j^OK?FdZ[YTǖJ0g3bg9+.S.ՍjJV"S/D>Yi<>OEoR8d AP!r&0,}r Q츳WR,p|Sz\UUW>S.UUWAv z4;edvֈ*NgVsIj\w6n4G)Ǔ[([(3q qP|nG]K@~r Y֚M p% G΅ںbzr=߳50q:$E:f Ej[U߃S] ժuIٶsi6S(7M1ϫҼ6A_U`J|\X.UЉdʳIRf%sG6nBLf3_xQݚ>IZz;充BPXXX~Z֙WuR]g<_BC@iﳐ,( W ?q`a{Vxy$"8/΂o5R8B} <|IЮg`<`qJv:@Xpz^1`G{zJM+Xen8P^1A:Oy*^w]oCob~n0]Yu`,Roj32vLHi!ilKHJq/31!W 7xE"ֱ&{[cah!WU:1N`x q|t^VM5 x{vd4 pi2V-~4{fٺSSհQPo*)QNUSP`;%E?u_\\ }8Cl`SnZe]Q*?k"oD47֮ޥ2[1 >sCXk,&(6qN!Ȁ߲WylWJiӽ^0P_~%ԗ&a 74V{kvAWy$~Aӣ,\i4 kǒ|KL( H '%Å<'?7Ъ!cj1x Т[ܐ PC` EP25M8Q'.CW?q&'͸^t)p8/]?!WniPG>௨3ϔ ѡVN]9sׇ^`ccmTxM^xSGe14>/י%) kWv&i5M"=.zI6- 4 CmT>ԽEDmiˑ޶ˊ"^A!_,-oޓ>|b}W^' >RTëx䔳8NreKݐ  PJUȕQg ?7ilKI3V>P3 Lô62|-D1^$Wp`t=PH%隳Zm%$+C-F Cd PVsՓ|IB?C(~7܈npF'(q$jl{C"kzMNNz^}  U'?n0aL?ǚk ? {Mƺx<4n?YY8UQ{9Y4N[jd0!7[.IX2I%ڍDJSS~7٪4iue !cc2Evvل]L:)|hz롵L"V)׷7yS~ cuKx]RZR~Ɵ]:2d%aQ7&{qmh?Hj,%]zg@RA[fv!:uC˨61k>ۓy rLyP5b2ŰlYe|X,O`,DD+3]`f+?_Vkm1&X^I3}Tb'3#ؘM G?jm_ eh Pcp`fkid+w8hǯCG~|"QT=3Cwq?DaA6!&HhdpPfNrEx:%);d?x!WRIFçB&uScN( )T;Tӕ 1u=/j7Pr̅sKOu&'D@Ղ08uQ5Q*t]u:ȽuNg6oIX?Yd܇5:PÑ~ sZA&™ZCDOFh"&5m`#w& -SBD^\55w:hܱ;›[HN3VXTQg~x3`,L^_{!-lkòY/PuY!f] gd]^.ٰD&$LbA٫@>{]߯K$|I*"e}ϟ/`\8gϞl:Co<'bpH݌ÔE h=7A7i.@V~W`0z# ^@ X{ |\N5\UϢHG j_=$uT0%Ua]~)Ka4԰i3*xJP^q=?3̕χ>*A` D\AOax}& ضgnp%, p],}N9߽Gנcx]VjDQD~1gFtP𜩤M-k_} B#Ai9 hъ0,W~ _-JXIIBlmS͛K=c.bѣ}聶P t}ў+ <ɚ'6oO >q~aQN,>>LV?d.}^}JcgU>YM]su SNCFŀh'@{v_~>E%at8`}6ԛs [=t9WӱQ [:o&^t ݈Bo_) 5ȳ'R}2AGd )H"h+ yW[)gY&,u?\1r}; udzVժwIz5Yj/jm-!l0^BFrOϢjw݈qGN!Ѣ4 7%M%j1("Ri8!JL8H4ʭhaWvn5K/暽gK/ {eWVVX++o|Sݻ[+B,v}:@}0V6*_{ؗ:N:݋tem6j5o@BRUcG 䘧m/.bIxqrˇ㲛.%=w1u/{F{eU5`'/` A:P&#uwRi7pO2x` ?Q  ¼qԈ1 P/2FRQK~kщ^,arZѻ`)E$b.NLu.[QYuuWKm},,ǟ015[יwMD͚%)d n{^rdruKIF0f6UC3dc`yF^u5'+堟7ㄍt}6HςpBKS^7GHfle 82R4RguUӒLAR0i*_ކdq[.[dCIv}[6Hcd/}@N 9pphUbK<7w=#?WM6 fbuUy(F8`ilzϣ6>OX3>ާA)Y}l8r]Pc[&-yۮ+Nn}XU TaAUZfg)]n;;I6/Ky;bU46cQ+sEǁRf^N1s#(Ksg_?PF^>'ˡ!jA=!Lb/iswTx,˒ yBmh5 C|KDڣr>I+8o#dΖ4"smvRk:4jerev M9:h G1i34c"Y1lgJ%&'} |СCQ U*; bTMSVT$Lvŏ@wmB!R]hQEzPeӔ5MyEwdif_Ze!`k`Ũ+F}yʂLHuw&=A* ee}+\+'SOa sWYuE(rp8Z\z3_bed1jע8E-Ȋ,Њd~}+fk9T{Fd<YuZ Ͼv_Ydvڎ{JO]hh+rAiW4po *Q0k{\-DB>Qyg3]Ӷف5Ӿr k:!r15Ŝ'׶zK]%>>z.zaUGu3hVv l(*Hv޻:|fxtb?L1w9lp_5Wo74u8G|֨HN:GF3m*ZEt6sD}OG!jcC i!Y}7J `5k©vP@;`d1!j/zb?ض(o[B$d1n'BV>aȨDxϞͦm (3GFh{\z%9'rzb0o ;=Ѣ(ecI5RaE\I%hp L2_v' w5>9;MԿ8&]+ruϽQqϥ5eϞ=H9hfn;Lw^SHGRZ퓍]W `]ʽ_mUK^/oZ_h*87|TL68syLYʺaqr,W4.BJ|CMEk$U7-;v1YL4Yع!]픊D2&CYˁ!G~N|;#F& 3J/>ն )v$ߧNv 4Brk;v̶*j?:f FdO ӱD@^˾b: gX4,@!T8\iy mlHQjxHYCȐ@S#׮R5yB̂ﰶa1D[@u>B\GV˦R6'rbtn3:xjUt!C/ӍVV6:NsuΉ48P.dbe*,)[<%o(]LɌ{x X-oS6E}i-8s[*xAs)؉Ti$P_f ʧz*Z%P9hrRv`2R? >3j&.Uudɸmϳ BfCYoѝwywn)Jv-X8gz`Eby!\=GrVr0P]ߓ~]h/՜ B(9,QBpn+* c@)oցDԨ5D&ifT-[}i 9zn-;(|B0O@˜f|ә>cYV ZVd"(b!&o7Ff6!(P)p lfE`EhEHFhk`.Gwwx)mok,R"QW}͒˜߉Lӥ5[lnR ɐ9xTꋕJ]1ˏl׍9~qȵ` +82+8Nc' ,zL?g?3,* [ ~CQ[b`.iOegb(,LdE;-A)BG514fxcDP0fy,@cE `kTQ0攎ܢ:Pv8GBd=(' Nș38Ähe47}sDjd)16{׿ a61-5D?25W w`\)U1^%@S W7 9V@W@7T/R vfP 9uxc$7urrw-o{ijSWٻ;1|7CЋ.qTX2ͬaRKd&ꪵWHjGy>٥S {,UeeHTԸ/1m^hKtLɈ"[VylJm -G!>tWiiaafzo$b7q 5v `=u !dfs~夾{ob1T"p谟2\kVUgJdoO&G{3AԻF7G-_.j;qQgKRo=neH1N̩nw@HޏAzr+{`fbUggmXBbV*s&Kz`svFwpPwg%8Vql3Lޅ|]/ǞrWcDPY@bdpɢ/pO6ux1}R\ ʉx_,)'zۇVIs5HZ; yYthVR9G%WKcRMSڜ ֗$hrjN}g􍠵0KŤ6k| 5-W0c()h.YImʟ jSR xy ?U/mJt?VstbwF&[e+,G%*ETYͻ7N\G]zd5wpX,˽L$՟&TЁ.k2їnOG'9y!l;_Ҳ8#7BWN6oR1ƛmKRZ~!HͲn-dn*1k4X=JZ LK ,}Zt˘c!  'D4:M%9Qwtg?ZcB5!ָ8^/3<9i޾-]5]Q-qex܁zN ǟ]x'_ѧ0Ƞ׭GRg֤[&'[SBpnk 秧܇' Lߎ_3)AQIծ|}M! Kq`5{Pm&CնW!]zs"_#{񇎶z>8Ə~263`wȐÂ@[U/Q6|0iQ\l Bbᗈ)meDfTL2bD#IQkUSD8L(Ίu0p-fagBBAWm6= H`~6`;q>粠RǶ|ffNVKQsNT.Dg Bз%[ YjdFUfe\SCi/&F)kpvZځKfHk߈Gjc π>D C2/GA2 >[_ZާCWh4^۱b/Gj &:O~އvT.=3wN"?ZVc0{bNLt>žNNqu>cxrVgV_ͳk񫰧P/-fB o]n@4LKWIϑOIg$>ϞD%fhJ:OU Жj%M}$v2M^pn 05z>-2+ֺ-A6Xܜsr6`hJRwa y/9>cI>>Y!{Pƴ92<4~r.WO#wur NUG_]582P콵!@Bwa%] 5+9HrrQȨcexH&:rƃ)Gqm(Ծ %nWR)E"Q/EƩze6@R -L>\rUJs{2M 63NYv.7 5aFp<“ةCQ]Q^[ð,uxeH>~K+QzY?Ch<hd/Ji-67ҟ;ud}3u~ԐsZTY?[d0^D{p5 C{F,p׌/\Q\hw&4kXhIJ,B/+hjLbiݲowN73{V&øQ(TCr}bJmNb_fgWeQN\5vFjÏ5#Oʅdfã>#I1juj^UkNQ q)MA>$$=1݃hL46DAWa[KCUN јh@,gGsuf]Hu3qraLuJƳӧGO\ϧҎ4˂Vy'XBH ¶e/X0R_X~ʯ݉d;v|]S#|nXX8Iˏ #랂;λ=E3yqC@AsL㼦:Y {Z 9CJ˺ ,<#T^~/a[t.NH d|u2M-W~ `UL3]"8H7+Hũ z=ggzV]1 }6Ckݏ0B.N0urlB@b:J2xSA(m)}{Q*- JGFi1֢=AEsT6E:K܃# (AHINl6J@F2ipNzWETxnjWe<x|<b$+L'Lg`^lQBY{ :aAR5Oͩ)˲rmVF:/硅ʥ{{Igl^FƧ= x6>5,c7C$3js%&zB8M ?| %*z`9!ЌFqgPL OL G-w9Kt6)l vV E~hm=vC0XNyVJ ,Oǯ=}rw[Rm+Rh٪2{.gS9b}Q_ ! ߕK6P2lLҬsL JJF:b%3C 41 c6ƜMFG}FKz.͞&+Li*aU=+48*S~m+2l}p ux)XA.FUr|(-II,_E5Q<# RRjM xPl=,&ժflЁ}`>Yմl$Dw1sp72X:.#g:bTe.uKYxB-vB:nHQ)&apKKxfZY]]%JI},?g,(&]o[766|Nu5op05E2 ˋLzժj1Tf=v\ .kf3 (u,- )D HFoJD lx(^`H+k%MG!o[?O~5{o|w݋^BBA@_D#{_gT:'Dd ,^{/xl d؅OW??fXɸo// jܛ7 t֩z`_d~*˾ުoW_uX\h;z5zz?Mbk rG°,OͤҥƲyD%RF;H(5Ha2؅qf35OR=۷ Ύc$[&'Hn~`kJ|Iǒ.(T2І!K[='9u mXn(٠|Sk7/ 8re9h~Meb[|}+אNLS$ +^/gJ'3WW=-RMR~Ct`7wJ 5ѣ%SJ'=ì;ZԎU +S.UuOGcH|m\HTyqiAa_)`]ղ"%K/ هzA?|ÁWzۗyebqq9؆_M%D%v3п]ltʦ 圿0eaTQsxЃX'[q U L!RkB>{pG}v/e͖h'B9m,Z<:9:Ș%aB#+RD)SF*4qg"*ޘYJ!XhhT0 5he ^[pxT_$sn~+=k& dJv[HbWq\r{n*&%V N/si85,+"75U,P!۹%n=/{8: bD%Nzt ƅ71BvhTcYq q0{- gɃ#W7=;TbH)G7z {0 0i+S؜Hc^ʚB %+ 2 闳Sp;ZL2S|TPF,@G!i%7p^Ahx\PWneO nYͦU`9O&;o}C(j^SMлWD}KOR :,鐛j$3$׉ˆ%BWPMAi#;e%9TI`"~Kqs3¶ m}@i߮|)m}P+kBOr WMB Sh/><"\1' O[z]j:(fgRKpbb^>ץDµ,IgfKEs#:jA_ʡ bU7xMz> JX&2w !W:KX̱F#0E39^G(KRː'2ƋXOF =!}3yXA&C Est7m;#XsHRJNn۶l.GKZo``*:?HYZCN~v-f֞ĊPBB07}r+B* أ>pWC&2l/(`G- _jCi;eaӟ>NWi:>]1E݀//pK^?ZyMX>R/ls\4GUa7R*zƊF@=~<`Hz'CX)ьBSbvZ,nek^^ B?[5hv+׼5̲kt] ϷK躮S]աJ}6\2k7^rX܄|wڤ]8Վ?/J$*ii21 EO@\ x$r! w⎍ 0 FipcM&l9Ha=v:E'еVfIߺ&Ω0,Bg!HV+me Iߝ9wE_wx?缾΃o[$u]<XR$`F3M3]u3^kcc1] clmuiB>ˈJ#!D }nccR6(e\7%/!MJ4M_ԡ86ָn&??B嘘:$k-ι.Vl5MDIڋa&+d0XNۓV^r ym■\ o# J>59yݾa۷[a_[A2؂26*d@\ s5j dcDE0 i22Fp~Jr3&д mMuE?SW_(.XJmßNR"_7˭;OGE=Nġ]q]_j$Z DЄv@8{M qv=MY>Au_Bp^>T6L{cL`Jjې-$4KS>Tou>3:KU7/ ̩Sh8IG6p۲'NLIolX&Odj gtDT)];ig'lMP#$M!bv`ьsرLW$ ~Icf~Z-/3( Ҳ?@A[o>%b Tx0c׵obZ/X6x;.WBG2]:~'gp ڡ2rI^UP5M[̚p'M>%FpS6EXVkz6<8M^8܃"ֺ$էo.nY Gk,{>%´Blog7}ӑ~d1JϣRxDr&9 15,ϸEz" JR>,ay๹UbDϧGuu 0d"N%gz$ݏ پ}fCp^an6ahT+u1E"3uwhoiTvUq/Y,(0P.vJzNrͭ'ëjQ>7ΝsE#B(GgP- )K&V[# gAG%eNu3כ.@Tm*W_!][H IYs , WeYEF!@hk7#Iո.m9s[RPaϬnQ~g*|(]Yי~K@ce_߫Gt|J〤+G:H/gD)} GmI@sRL\ۥ ȗLi\ufjf~ΔdU!g6 UzTFІus[WjVkxI۵jp\|||xwNWos?{n7, [']AkU& u*horimOFP~\lHwD㨂-}8"hĝpyX#?\>ij5Msl;NSP]iފ#C?W` ŗg_v:kTliळippnMW @Cr=h0HnQ}̮ghl 2-<%d4sЛП4a3b݋Vt:m6A񛶖0F)^ZUZ_K[j[K.K{f=~Hcb-+{cDYLzM7˦3v9}(>,^nŇ+Q%^a7XћŇN*\\_ q^8>u9_eA4`džDؖH%Ea5^/eS 7+z;Po(l1m݌%̾{VBX| c݆6Sfuj|7mb Ŀ0;Q#{Q.3@UQ/}݊W2&J 'JY'sjDnY?x3 զB1"7f^X{ 0_^J:$RvWz#]v hL4}M]V8]ρO?lju}7@'Lm&jojoNXl\##XjutCkbbNcH8'&3#ӎBx$ E⥢%hZD+)y+_Ãč[dN70V?E|] +&߸?W FtCncEEyl}[*"Fwlr(=gA$=jS Fv7K3v,goHi^7gF-a|ܮX+1'm5 <7 &H6'dfHt\ZQ)Asǧ>hY\¸_aZ .,,tQ™kF/u$-+v m|sciiz-3ڹFqvEbwhZ*{-"lG|tu4)XGنgހ;xEX3vL Q?Z'IB I2λt{7Cǥup,+ʳ@2J-..% / y=g޿,`]@ e)i(1.8M8WGoVױ51pnEd.ݟ5oI&l\LE)&pb~ےP^I`iK>{SUL LEuy Fi'vpk D{oO/q U R24fWxnEQ$FAÝ_ca-W?B oq1Iqzk_bʄ)sJC^ETQz%Zf#c']_!-~S:54!z ^y=! n_5^KuI}`368&N|gccv6t 77&}}DD/~ CAT @zjnǞquƙ% ] z#3k=TS?<'SEpNOwܑ =Òޜ<~D K+렿pLSÝ;w]^''ˁM$Ee+8(T{A<I҈OL+H<6Gt)%x^ddj\ܢ1*K˔YlfߟP);z{ʒju>KoQIF92i2GL43zVW6|x I!/g'.zlUg-F{;c ZJ4UOP$2Sa|_$/[2>tg8tySYn /0̱\8@ |??+jX,oې2c+kB673>pyWihE$ΊGq7RN]; 2""&B}+P$b\"֦:g+mtǵ2o7fFˮx7^Fw\7FY\^oӧnEiU66D!l& A\H|[җnr°׻Qm7Wފw@.6BGk'Ћqt!J>yIz "e"uK2rQR&Oh)*gs=PhAJŸ6qünry! )3d`|k]}'H;ƾsTXl}pO^Vs,E<z8@#>DF~?$ tu!(qLIa\NpŵtFfR_sssmuM9sR*,oðlsg0PQIw OC{!=XaK`FsדU1u~63yyw?ɃNA۵E ʢǏI}jQ "- :iP*K oOUHL1x/eسq%j"TGQP@Tb߻ޭT*IRQ ηmXB6E,`9:ٶ]S=råF`%3ʘ f=\7,6)i2mCǠ>:W+11zQ:>PׄCEi^g&i РiP5\|tϡ,7 HdSMO;+vÜF6!h .CY?85N]kQۥFc:i`Uช"` զ&ɲ-Fa 0Y"D3zX$F%:p51jav-aW!&+MyQЖ)}S!3LU8Ty5W M)p(eO1EyQо}3\wgyE N:m^f#~Tmϵk-*֣,'*#ns%ߞdiīE6O‡?D8$*wQE/H<Œ$iZ!xM ]O ժ o=]U1)IwHyYd9WXVNK%,XaH-4Q1(r \SB?g=/+ ^i.8A1%PTv 6EQ>;M/GtDyrK#S@y>7(QCVM|8¨+)8/ ۶|4X~uֳa%//z+/,&iB&8M>&% NiԏO@D̡(M*S B5~UU}M#_ȒV& ![K" dk JŲ/{K+(}jY.RpIQG @u9G m^ʢD D5vF5`5Zc*ifۙssaRbVqY"/8?#nAǃI9&,SCQLDN0p^믭_j,m/샠=R<#dyBFx)q<5Җv/]lRc6` o67lheʙ}i(زDq *ּRL)SN9h=Rw>/J<ۏW?Gh~mM7c[55zY{|坈⹉t#xȓ ,tܐ7$*:@2nV}CFlk FU{bMwaQ ]4"VTb]aLVU|6NYSQiP,=gCUz0 e^qzUWk\MS'>nܖl'TMsAe:.:Œcǜ(Kp/nɖCfAK{vIʸ_o,(F$ DRf춖#.OQ/މK 2 mt^~B)~||sԶ&_};1¡''cXnYqnۚ+36{j|1}ƩC2S04QxQE~6 hؠ@JaWӎMmLtM\ifN;VTp!Q_]JU}^ ⅋ׇͅ$^kEQ+-%tzדVfūQ5-- +T$=Q3 6ĦS BN3|I}CF>_[ƾݼr0sX +mIvYq{B a;d ;,˪LF3e_ f9rZW[yzj#0 ePE$4r4E2?؈*eIEp'('`>T[)>Bh 4 ?t?O%pe&U0w**QpT_j29 f&'1Tz݌ޛ5IR.U>vd``>$wvU8z j"l̮[+SkbM#^.xnnpt,yJ4ً^g<C;4풖__%4HqkR <v _Fetۀ,9^9$I֯AXV*aܬ΁,WA8AV+[uo URu G_wI/VK(XPCԾ%'n8K/wA♺ X5_&mpM9 ufHMx 159ŎJR:ßcD_V ZVefDuS,8` @O2@Vuņ"߹IY3! >`/RDži^`sf[m + +>퓤ʃ2U6PTLSF1#ys!H`VxAPtijdpZH 95K646}&'drao}_B+tPM=҃͝n (9o1!)Xv v}7kc`wG-2'IY^/y|n=LF^$󊾧YGVo4$y$ai$I p.).=pz5&hfeN߯8Niw4!<ϐMӏ4},t>4g1'lUVi̭S]yZ1 N~i\c.Zν!Xž8fǐ0J >yAyj )iUr0b [W^yjc}"_E44m ^ZSSܔ߯?ckjnPjiXUЊ"f^B'$Mێ? Oi ^gw趍@|T*T9S-iи8&؋lMfa0]'\|3Xkq--pO`&fm,Kb,o}[J*W=3Z->84RQ,ƞ={̼&/s[8-!Xycʡ*el5&k)1>KNiPk/] 9iq6S"UeYnض$=Uˡ_T`p9,f͹r|O{OdL?'ŗzG\yvFÀ_5t wWnv[3 8PL ëv4._YVF8^Bةj\ctZa~J+q: OlCyW S~XD; *2)%?:OLnz_V`nT*N6kLfaVTvgPx8V]%f9b<&NM-߻y7dDR; 1۶+u^w| ”(mLxw==S;2r$`?olWDd'i:#7BrD]ceDqo#D=tz3z72=g>/_\QKWPh lW-/fj:a'3qˢ$z^M$qFq#RoiUUAUAU՟=PXR7VthhvkxqI. Œ)DnP 3ZeTI\؅fgK{T3zuaIZN?Gu=e;nn}Q; }tBZOO3ZR|S1fyuܹsx߸Ӯ8\`^(=\ݵG,ӬI&HM\hGDŬÆ0I;dO۞LHx9ݶ A&F<.'Foz= 3-Shy0m[:c)"Bׅ.)eTLgɌo!1|> \T15SX`_!}z(`')7M\LkasI%nh iDS9',4o,YaJfKeM 뵴gN1͇f;\d*|2=r>gĿZ;ėۘlLĎ,.>+= iJq[mTHST;hvÛf:5Yڕ).VN ށT쨊p$){h;U"}{Lj/E8G;YHzu|fO;sxEDQ=Jw!q{RJk JZY&eUm_6} JNRmWY11C2۳)Jt}|N']4([ SYm={ó`wIamHҔ y8,Jw}1o:qWvtmmV+ GgJt}#Kmk&nMO_R37g0M&@Qe2EL ]4Y5\})e>рCX7:A.`04E jZuH\v/XX;e4l->וZOGvn%9,w4b%IzI8W8^/9,^~<Պa"˧'_m-;IE <[.\21 GMU 4^]ĝ. w?-ґOm8tIS{LWr ^Eχ¹ J;L5 q[8E/&·YT*wqt]׀nIrq5 k&ۭ~>vK0;SPnPxܠ굮L\YVQEVҒSV~bzf[öijc4◎eCgAɖUxoi&K!I[)DQԐ+Q)Z2$~h[,u @s><ńO*'n{7e:#h.[X}QB؂?1k$EV7pS{,¸:+a,ɈKQ$kzz:c]$nsιӵeI$cE6M麮34%* eItIRhL2MC4UdI>ACS.nc(RrlsEA1wM&cC %֋UB8,%%- ^VfeU4MTF%s1E*U5YԶ)^OlidkȄȚt(R[#|÷WнL*n'@rFE zhMNL\oA(wFZݵXPrw8_P Uk2מ\]]]XmGpcDku4P9E+EzaM !9Q@iLPAJL %d^'M$?)Hi9ɱ(B5E7zH; Uy?~ ,gXY_E_=uJK`q0 id\MഥSY Ιy `>n7:[^Ut OWggbn87shQ^`0 )ь 5US;YBa£ TuԮR!G D@fQ4۬4BQRc~RԢ<%A֜"S!DaE @4* 4M#@ŊBUi0fd&*+gXr(EGM-H 0@ x2$K"L:lt-TE?vi|Wsh^t#X}(Lz Z[f:u3@cSL.RQwQlcR&YVԔ }%[=<3y-RD$VvfgFդZx0TI۰2#ཬaA6H1ؑ7,G)fXp0݆F7bC0h_nq4O!'2nz0D$+Ƙ::̟A.Jބ,,2nePCJxiM8z~lSl' tlePawBh4 /{ Y]6ߨwqf .=HCF|V?9AtV4!NLGb"dn֪|lFwnP.OSsn/\ž*MUW!Mk*jQUQ*WV?뛹EH H[M.%XiIa'R4ڭW R{ o4?:1[Z)@k,EpŽ}sz\HO˗t^Jf% z=Vڤg|}&yI-EcJm'n،s4^oi@d#$c{)Oz$?K~! yw!j#\-ݽzYƓgqCB2x8ue$TuPf{j- 7hm},;FYݩw0$7R=>*5II fNjΑ,oAޘ(pAsz0?g:f]'G$QլvZJsaI"eWqb+8 9jB T`ieb4!%]B& D*?[$]rY ,HuH̪s܅ {1Mq&Uha<>c%jY  kڹ;A74oCi"Ʃh|]HtuQg-K<RQ |8T6 3(QTtDQ w Yi\} zK={N_)gwZ_wNx/R)V2C,|*xŁZ{hkh\wy-ɸ#VUq}ύi #51Ё ew)8sgЕV=TƆxja/,8\A ٌo<'j WR6 Vl 'zdJЌ’Vո% B>@}x;ʸ8%ChI2]BzD!QJ+uqwfXReRv9,S;Z\++U_'^Ug%OwF4AR/ͪWF#_U䌼MzI,H,f+_hbPQ1?uCWCP2eP-`\FbM]_͛b辫r333W2y@<=333=] k)kڏU] i`pF&Ppj;B;c.LnDN\0Onq} \#<9O0mAЩ(%j˰pDPĥ^!mOw ~hOr7})4xg䊮fr؞-C!=2:`Ö񦩾 VvD~ݕU%jK[Dt]hQj#r >se@v*; Axjr׎3 h~znۘ^]ߺ։ÇfsT5z升WWWWsL'?1m|:@[NGDj8@4PF8 C\>_\&Jt?/l}J`{$kJc;^V3Qlڱ٦6ѿzj.RȉXF>k:#CTcOް P]^~߅֑``BzESҳ^ h2,Ae9| 7EQBl6aB8x" a([ߵ8wČ^Gيb}x("XцYtυ&`oE1-V(x%`#em3?^ǜ\Q@|'})ߦS܃_C5řU<)r!V:.ozW6g=;v&@aϞs&\aKq%1_NFuÉ3^T3eЙwFMCM)wnM_BM䜴fP@ZW^iC$If"M^w}&+?`<&8[dM}!$hI]#RF{iL +Ph;h |8TQX\>O9B|K3IHA$ubZ$PVp{F%{YOymIulaPR'p8vlqI"@;pN_+_gXR[AIVTEg X8;ǖ4P$"+Wp>2YH# " ?=[7*%2mm=pze?O̅_ wrfo4I$: <3cV|7>NWo".a3{5bPJXHݾn2#(uhDWYňQK9iYNj2#kbxQu,T!e?*1Iކj/luUn\O},Vx{RZ>({K{/(#$S I:iX˭Ǘlb`B}sUgoX Ӈ}{_nU<-"00U՛ Ƶ؃JB"x>cyNv1J[4Ҵi[B3]lҮӟe[xNhk)|`īn , ϭtUA0N!1yN[/95ǣd 6赟b>5&8SSfN(&$ax Uq} AdmSN;Vr<ԭu\W`WtkC tC\v{GI."yӧlAKXMYz"ϭ ".-^$&+z/?FXoY+[ &@$N"8CL=Srƌs)R׃ W[#{Z;M/_^zZ?pPq䫤ֽj<XQTɝ[x׋a( G\q{LZRCUl^!+e=x92Q-@G2 p`u"}~J]%Mt͊B(-d|$a*l'Nϵ\5T;0x)WъQ.ϝlN'\|,8qm5z;; zk{[QXbL57~@-5ld[ԔV'thv[-*+++ZV|ӚVթ|nj234=ki1\s5qMJ>h4 0kfIu{U7(8$P(4  Iq)n/ =t1QM^Ep8쵧%cJ|~ ) SH8Ns)᝽ gxϠ.S?~ ]۷uj7|v Y>R%(9`SY,녢"(}\ui;j |-#m;r]菕쁽]uцIi5S j#E>sÖ8V+u 8&9 )H ? 81`E]9]V 1&(jQ*7;cKPTݛoXĤkƥ*2Ig hw6AXm+nc҃Si"r,gCH%whnxeSZP]BD: nr!!N5j !T%|9^=q@i7Kmi' )d*r[ۨ5+F+vTI;ؖuuH #aةu{rf:;eߡm5R))TJ~DJ&ưv Sg5#31`S^c셴k8YU3KǨV:ߤv tXژ9L!:/IOamE#0ҹ^5*^U$JR/Ӹ@%Ko}ǁP#0Yg 5D!ʘBbtEldGh_VXdZʖАO2@q oo9I8Lz2[*Z/-/=,rn<|6;9q,/borIa~yƚmzSGQ+]&\N&clfМk+U[^дM<g#(6AH'JQZ Jʼn:TaZ_ +^dB.nXBS&T*_آWG/!l!":uP+BpfG/Y[4/u|#i[=7RP֟7g|&\O[Dg{~ VŴmDXJ5 Pov4M9fB@f424?;zNt 7TЖu;%$[i7 /W(^ؘ~C !X  )~XQӾNgƶkD%rBtk5>*%,qjq uêikD]xN ĹboG٫.M tOROV/_r7R( ˷xmkĕXG}Ō$V!E1/fj]Wk,8;~3cTdPpy퓋Rz|wsd|1c(|i]OJ8]B TD:M TDͬI_,8&/PxGKDGKfxH\tk-(o☔&mhǾ9ŊWd5X@&T?y!N(=F c=v .mz%D0Dk~!j% P#ѨBz&H*P{<(W} &@+B ZVMJT R)IVY@ ۨ_iT9]B|[Sk43 H]:X ~*I_10+%,xg /+)ԝ̳d4p\6;(&ucJILVK!+f̏0̐?3џOh;e8N[X٬cї>f)dsm,*>$ay,Y 9`7P?@H\d>S;WpnAݾQ{:o"ˍe:JkGQOLScE2Ê[Yz]PqQLlF}|\;<<$<  9!}!)W*DĜKkl+~~9, ȷeh_@>d6Hޔ{7\[ zc38[d SƩ̯/}|C_[uTցZ'%JVRQ@סf"\zckohԷuqm RG<َcG_t&:BG8 SI0Wxͺqkp'FAL?j1%&3B`9NƠ9A^ ':SpTAD)b>,yZ6\ZZqC,@ qjD@鉚hȄ NTvw퍩nJt\n!ubE$f K4J$;pD2Lh5 Dg%z}>XhY9{WM)6!HS[ 4 4s;w.)9%i<kfl WL4P+BVhuT0#f:;vWA:#vAxQm] $(f6BQ{7'[~G?ftEɻv57?_iXg,[QE*yX|~u*9[$ҡd֎W>Ҍ$Ύ@awtd%JMe0?#{_<=>-uSF : Ab; a`ǰ׳ !#kU[v>52"(e*]8.`CQ R*z5Uɺp{${!3  <{}}{ c]ڸk]? 8N!onUۮTkZMۮYB`;=ft6`z>J̧fs #=|iBE /=Ԓg},9kGͦ}7io&~6v1k"zsP?N?1߯mQ4QbM,=\%p_sGT*[\ZZ$J29|8˲N{ҕkZY\ZZ|_r#Tgxr䧇aلg[?z'v= x _oD[86zyd̍])gYv!8i&{\u8wg<29%)a8ꯆ.VNj ZH XB;AR`h E`Y B:ޚ&0 _$Q|c|J=g֢T5\_d2@'Ns8D`#)~'1&(IJFX؁O- O x D'BĘROvW>#OXH;:^\(Awι$Nf )-|XM.c+R|0՝beK^W\Ri8k)lnׇS-x[ŀ7A()~17,"8NX\5F]Vg NTYzBQmG(IS2ǣk mܤvJ촳f%9`iDavCmm׏w8HA$EFG18@6ĉ )} LNluN "VF.e*6ҺFLSED1ifN)N_iznAp̈ҾsBˌO%& E;2: ?9iQ\`J++$[8x έvurCȃ4d5FS-+ERJQjH|uҩ\”;P\)%+h>8۞ܗn Dб9CK5ebDD'1%h[{qnwv`'˜S馑zpWWFY s߄͏qј#HBxR;7oM{EOz)<>Og|)ժ#=m&E9 snBzǷWoDAaWs@1DZf~~{ɽ_C^Rdj.9K2.oq=<RG{ք(@Į0qc޿Vg(6ўqljĜ̩9²t>d %;[WSz_8̗f~Ҡ#䝍?whM݀bgNY!D'X\1@zQU!_zm]vv_sk޷-0),iп:'|bxFq}}[:2fLi ]@d>*C"cHC:W9(|jWݩza`U* X2&xzF٘ qAlBuEco|~0cabE k+$#|1@0a! X92y k߈%onX$;|<uӚ8㝂>A}qi('{r\Ksd+ ?fz ud<2PJ lR_>HӺqbňʻw[rnw4vC™=_[}w DBxsӂ6t)F]/r@dzXo!h)pI)ԎT6T2| l8>3 xڼ@ -q6I9bks`1ԗypfJu&NӔFV}=vuO:%)Nn0&~ BfHIcNq)+BPpb琀_wַX?8 -bddP8E<:[|4[(jd߲kW;LUW߳ʙϼP .f'd8Ek셅@!L'XVzc"6NU9|HaՖ~mD 8K-5 d?Ŕ1s@JSq@uq(rTX(!Q9B;zpGeΫ̱EF*% lG1u)d U0c{L1g0Gi|jtj@`:r?s( -BzhO/ʈwTJ~DD2BHA%.DHO-<ڇAR\jSQ i)ڠZzWcb=m}oS5'-͑F49titx̸@lҹ~ze([[=U̦?;Gp 1#6{g f q$8 MogޫϢsc*a[mo=2NVcFJ XRL<J Rnuly|5Uuz_faY*v*"k"m5nB`D zR0Ƽp<7Nr~o"LH-gKZqaWY SסUXdU(KR@ҟ!/æ &VV(PB=3Z3ttWfB%@O{bwZ=ɮXG_e7ql>GhGwP?UA Ihi_c j2kx),BO][y)/Kjmw `}e{':HhFK&@1[^Ó{\+9ήSrE ?5K6GQYD7U]J$#DĸV '=W>P@rB/W!_mkp_sʡR8p*Ww'W^>N+_ =wtu%T%Ƨck*Y;`yuŒ? eI:}-ԁmb!03!EȬ{_49 sM8 (~*z),&d' lC'-7$MAy2AB ٳV[)̾ )XDel!Ǒ[XEb8MG6UnFVkkNA&ݳx1%C|pf|geWvF(2SJ(>fWJsg,F=U js_^Y۞>.H:JRFciLM{h;82H[#Q8 lL4fӔQiaRy'˰dGȖk~\B..w;9>gp|B?>mzZcvl"̟z7w4Z |]}?DÆ?؇M?@!_ۈAuzCzei/H{g`4 [nb3hv +n]ߥ3N:iΐ$ jC3+B)Q|=.1z0Lf+2 +Ŋ@I(C!&RB0 ,gDŽR1`@ĩ`֓gf7p=@c}!;{3؁+xqj1 oZS#:̗z '?y0) %icBcpX2l ӿo&k5BAD?2_>j ) odq}_HR}!)qMѷu mI} , .C3-#)_JJ]78eP^C+I;.YJE:[ g^ LCnk﹚ # o笗>gƴay.o7c?#Z+˭k)şlQ~;g?@9{Z@2U6=wB^Ro8琜v Skxr85c@E.#{5Ҕ?)Zt_u8 W8T\ػ)'o~K o!Ey4 .7S-8/j̺ c΀RDbK,J8X0oB1 |łϤdrPҹ9}S*ȇOS?}Khf#7669]xjŽߕ쮬_DXwX*C<M4Wc}&iZRhY™Ev& ] !]^@{mN)#™r/Y9 ?e>YG𥾬9QsM: Sk"ySnˮT*qc|;/HK.9^fq71K?Rn7.]tsf(.4be WB<`:S<q_5S̙t Ĝ*$'|.u:큼9s [oO3,)C$ ; =(OQz (lG*JS$4c*]2SZ9jeH(B'ecU걣0q` 3{v֛֝^ i^$cNNiE1¬pqYbOvgW9RSz7z/fS,LCE˵JiҳY= igKwnևt緺@Usn~&1:DAɡ?mp]YsY rǝD"d/iDNT[yиϱf]=E3DOEfvVW8@(ϭ{VR;pgIk~.0Ŕ5{SgaFrK0]vD!+luNņRiU(zXUVnhy^3wa-0s9R'IP65aI)I ²=uj|vL&)Y֤DSuB5YK-d$/H^/T.|!Q;"{vIp]Z 4,7ˊ~pq39FqV\oohg*WH E(H:VSj)fhI rŭ9ܰ|>j1i3ay}ygxW] ICRU$s-c"3ڇ]__h$Iy#Tœ_N `cmpeW!ҷ^h9:7b8>h)0L3I^P(۷s[;x߸z cqЍ 08q~P( h{YR F?a>bLZK9ȉ6Vpr:σ$НN43$dKn$4MO[(h,2|[ Q8QA {P|'pd|-XEh>+1 g`-~PL@Üp]m@2P#7 y oZFMúF>T&۪ CF>BrbA%n^ɤ'G=?Y7!zm^8BYGRKq A:ܸ=K<̅7,<=;T )K-i\lU#ч3n@HQzb(8ʙTB3mw(Sϵs`CA+0M :]lYPx9M{€9=|}M++M@8x-NKY3dA<9uU_+J)=>"{ T?ЙJ stLX{ Sp&ȋ Kݒ)k[394& ʅ&q6>=ϝn1䡲ܭR(I]wF, 8Se] ShJg_]~Ȼm$[v`WWn qb 9sLșoaߙ?[z;w' ЊaA)tze ;gu暒#xMlFG`a-PLGHRUcjGWcʹ+T;]ᨆp^#L>ijաVCzAjw)g! !1堺ZǝU[ϥ+l CZ85F?l`#&E120ߧ(uàxzB4YA&r U^-#,+uJXuFMřBHi~s7@R-ٞg#Rv7U{~:g 'ߟV ;wzqpRCsfRXQ.~m57m+Ą|Su]Kt`w璊54 2]^$#òoq2woaCjS ͒g) ,o?g;16i'E 9&vBM*b@0vO~Z- sD.WDcE*"v쟶͜v[.<Ǫզ\t6n\:FgѫIS`Y$FH8^ k\X*9uB4ojF4BvEE &)8 d! # Wk7o:` +!DPW)kVV\GHȠTidik[<j9A; ;bIӥ$q9 x ynW@X2qnE * aBYUaEf[u7cIRq7ާ:qXfBM4}d J|:72qF]>y^N=SO@._:΢W 02(jOW(+quM"VN8z>kJ0U鹿Dme*xGwqu#*)n=I_}$񿻞_uq6%PR>`m|]@{2٩t>,ANJEZm aj0A:⎴%*aJwܸk@vI]7]Zŭ^G>zz=>I]M3/Y( 74LdZ۪)g4^^@i:[~d >V͘z`|yrQG!K2_ucd躢ZxRU'%K{X::϶YU-`/cP3SmR93@̓JE^4}?_ĔʍkڍA).t-ό9Kҕ}e@^Qi- 1C(RXxn90MK02%'=Rrh B ×L+,S ! a/$ 6#081q!<LWȹnm mK "P-;jah뮛+x]Ug>ǿrZWc~YϠ#P6\֩,]Ӕr>eic_p,hq;N^5H6s}*~- QB ;|IJ &lnsk=ZֵBv r"C6O F.Rv#XG G: drB,hؙ/ퟍЭR5E;E[Z^ fj]O@ٛ\9MԚlQ:x.3Y spzY8N8 VጮS6LP&fxYf7M FlZ1cVjS0&k?$L-]+lY'ahڞ?cK̍Ry#g$~w]RjU5eFuv%%j$hSBufnP }雃0Lc/Q- :%h>ڄ^;UM}]/7}t*OG y݄Efjz--]_4ݽi xGb2uAieƷ/Gh-1*{AgYxfӜ hm{>N3bBEe5L{]OY6J&yeeqW?|J&K:'EW ̎}XbEov3*_"쨮k}v(#}ʀݸ-*%m6?OY&XF"ҽă4{Nt} >X'|Xȑ)LX1 zJ{lּvڑlI?FJU? |- A<a~Dϋq@k虉)VU0@3e{˚Όe&i˲aĴh!E Q݂Ȯ1n&!NʟzAm|jBժo8.\ Hgo8sp\4@$e6q9e;~jr{v:ϽL3<̒=]&{r;hYu"*sG{ݤ\s1 3  ;DSȠ>ɝ3l̆Iڒ{# t !Ql `4=8DŽE&% yA&fӢuмJ# űPn7>eA)0\\Ơ*sQf785ztE~ *_ :_\Wh>_?2(JIiSWyH.epj^O[4:]Wnur6 (Ѩ4$$7Tn3AI8{`Iq-.^ ۥB>)Q0}Vv.,nunb8%$!N3aŹYi2:IX!L5REa^mZOPHo0 >g OIvinޫ ;wDOxrEj-J'hʟ{APdI/P b[S>#a]p͜)6u;7#~FN;#Ghș 7lƇT,Phhç[p㍍="gwNpk{[#ga?̸7&H)gbA̯똈lj.!! bzKjVuo=J2+qnyɒz\ &C ̇N.bl,jI¤i_ 5YJz)xa$SS_gYsO$},15m͡#Z8fץǸ oq3uge8tp_=ـ2Vǣ2w,>Wͨ5UN <Ϡ6fgcqIz{2>e9iS5+o}͡4=ޅC_Mx@bemgn@ {1mFZal5BRҜ )(+4/z5wp|i }p"SmZ6sZ`oY [NbOJK|X-p5{<ڋBw7Oo毧jB@oB L\vMVT?M dAi~lv|f*!HXpe*9ӱQ2xC ؒK߁#:h~0"_x;S " KzGRKw7tlV8 4+xt^B(=>>e)7Uj4讵%tzaY7l-I.i͐u# g D=JR5|’ՑA~[^*SY JY:FK"gr4 #5 Eq A(1;{TPMiWQ Sj[t4`"ԩYpMSPa[T iO7qۖN13EQYUr>'cɱ;+KX-8 28a֯$haHX6PHXFA\|v.'cB7ueW4,)S,)hV0t%7GQiÒ"dl^fB +] Ɉp A"-$K/^Qe#ݷǪOě<`biC2av*z3z/1۞hS.|#^-pkE A". ª[[dq|^uE:,J hZ{kA69Y ,J(F,˓Lf0Ur1v%̴=˓n/3޽(ZGaM3r ԏ뇹=A)e烐sp^+O7{jz2]m% %NT'jccǎ}w 59`d&VzWa_zoC1Ccْt7eTZmд阾A׋0~H5ʨ:k]vSc#CcP|U[$ qS/QիU/5OD 0Xkğ Wcјa{vlTl+t#'џۃ F=䂎m9+qbDi&A4A4-+Xp֊%=Z(TӨ_(T0&Q-J`Z.բۘ) rmQڭwEoE#>h'nq ֑2[kqzBzmϷ*b{޵Sd vt)_BUdi0jx2mcbǵbxD1%`+9xJ i"e)N.BW`ҤKxSWljfROfaYeͫ>ލ>>~/C8KzWMa9>_JǕ\:ApPj%JUQP[yc;eZer8+_lWTE}l~~q_^zǗ|œuttn za7j  [wL&NHwI}? \wћy=ƱB{-> u;a*_@ܿr²%Яk}$twh=$XJ/aZ'K<6/̦U_)<>Er0۷@-TKW)nǰdpk@G,8_iizhe0U &m9FXxݖhgm yX"Ҋacڋ“dv EŻEaBg] Ikd'?COwgѷ$4L~jq* ҊY&C6A9.:7AA2jxW:Jzۆ_ j)V=Zgߡ0]BPm)Tgß24iOQ޳օFe0 3{jro FB.>33SP,Z)?R֌n닼Q1L偧/VI{ I+DCTL:㶊h375>9A{ :~F ?MSނǛT>lm9#iƉN9a'ڇdfϟk?_$y3U,te{[VB/W޴PWHlk:!}lghD>$Ɯ|ǡ R$T1"oI1VQ\drKD*c׺%>RScEҟfi|"WL>G23-l\_FQO$zT1#2bcKJ@|?Kx2t!vk;8>nVST R Ák7U$R @z*@:)S^["G7BC2 5 3;|#_^MJ 6$b^ l+)3) Ch 0;TzPJbB&i(Nڼv:+mnB3c{pLNqz8{$ l=?rf'G˔ѨdA^ Ui`鮬T`j)+tΐ姕Պ͘]6? wW^ǝ kjRr;W@v XWj%LM15ӓrcJD#Mb0>)yETWŭ)']mқ%$;Ihةʭh"*1깎+~;[l)x0qSRH\Faқƶ%$I+Vq,#VD U¢88VXSRxGg] نQKkڢ؞/$`u}K1.!"4)R JNv\G- (Z^;ʵtXFq${HxHwx0(jK4QxD P4hSJbL(^w|F6 me+j^ԙ80ʔ+qw:鴋*f3Z}Q If.04h)%1G5SJBL!b(DR,0X`1Tu}ێn5d5BpƲ*|"$`q5ccU'dmqjьlxM}BՇ?nYGbPH"-x 6d]8,YT27q#Y$]L,挱̤̮2 f9* $Pӗw%lL0!M`%\ʪ6KMRIx@NH\ bL0!$ݘ1Ƴkpd-U1v Q\1&]FD[6TFTOaS=?M:̰ q*^pL&[H٭Q$ŠeEq4P /!%/"/\FÉ) aL/8qNhWmmmmmmzM7^*vׯ5<wd!eab\㲨\C"ib\f3f3)'.(9~h^D:&LQ_b֭F*ʍɆF(HoG%n5~k"Ϸl:IgY#Y7 .mN,sKppФ2Y%%*\7hj}2kVu0@J?*w<7<2…ŮzaBncWI0N"`*kw +Z{] 7 =sȕ{+ K kAxjmuuį|Mi Y5ϫ  셕zd&R.T6 NVuX-R̞ 0ͨ2d }`*jYXh6 SJӅaJ{{-tARi OӅij.c~ܵ[ 0o v*(NCҦ>y^[3˱#u O>eʙ;t(ip;RoDŽ[d|AAuIޯɛH_t7j=W1/xqO~O~U|I2 ݃^>j0OQh-Qt bpA긜`L0Řl |r{I-{b X@O@m+2h9Hkܗh;$ $*r%C9xHenb՚ ?CPGpCÒzg%I( IlGdڇWk׵A`) t)L duLO|KPΈRs$@ǫ>r='T$%M P: c C\/)\+4a;C39FHFk2ک+*jHE|kUҌƀmb +ϫ\f 0v5"5q74^Tܻ*,F%#^%L>qJË\c0c Y_l X[ոɫK#BT4œq<ea!1l4.STzP,lկ~+9s&v'07{MtC? |xL뮻>mw? ;ƧﺞH}v羈f6tw.RI T`=ͩQScX~xEN(r01JQ2OJDx H@^,w'-lRMPRsћM3 fu],&r18XU{+ww}gQ~Y>|,O:4db`' !C^am10̲B~:纼eR^"t1J:_=a߉Ȑ0[e p][V)jPtN_FmV_ƱR3՟,`&3hcc:q}"Sռ@^Q'|L%j\I.VzJWMnB(Ka&oQ]ڜHW2^Y!["Wׯ边ZTV'a%֧l*:mlbA5F[SAU)k.,qՓT)85$B"X2JiHj TU?;`Ilqaꪄ*c kfKKz`j4mۘOVUP,NNAU%C4w)As@^}eKlsmu0ݜdqI/_qon.2rx^K^՝K4ɀ`2i…E邓W ZTBob[*FX w-ݭę]ÄŞ1|A;$* qF~{ak1*jnmlDn0U,k`:6{UR$XM/I|.tFϏw[a< k;yPTm+?߹x>%|.0?X61&͛W<`3"x__b|%y"j$5-Rm`\+EҲ-fUĬEx,ÒC(frRK*UrH,%ݪ"2TQ s; y_Qz 蠨TeIa\$Y=HBf_RSjt`=DFt )+v|0褑'6cW]B/vvt:*c]F.g,e2-)ݮbXzz-js^w|%W]uUo cd(3~g8ggggmz~9@bpEEPBdfA&R`v\:UHt/ZK?wۺw` nI!DqzP~GxO!D)}+be,W5\U?+|gjn ,RCy}ٜfm)%zPJX/t\#,UAtKp-} =ގރ>hDaX戱`cď:Q*뢘yUo(ea&$:3. %IS6YfGcÝP  x" [ _-mUs¸h`B RI+ݼɅCsJ  bLH)tȹN&ճUg/`}@{ #Q۪p1.,HB%x{1Nfw/rRLF2(Ւb,3'[y&]+'$F8)^1kXz19d|WэuEiAVB|~M>r+ 81Ͼ1`p*g ݃Є$5L󠵅`x+JBՀ~ujvvYg;?x"vpo7y~i,#,Ǯk[ˁoȱc#]f7c'zs:^MFjYQxK lc+j1V8.NecܱPDzkcJ8s&\^˦FgI٥I}UOS,\Ψ ScSV3i0~w(@ ?4'>"?ض_]#%ϲEBA>@} Y4-VDLn1wJRwfĤ'@(AuA3vpP{Be(d.{G޻} s9u^I"VUFhp- m1)-U'/.^jũ8%抝ۇ&cWJXL-Kbe">Fso X۝1ڒJ]tW3رC(I7·2c{QLmt;ƫW`Iw?z@TRl5=C;KJ؀fdu]n[0`U!zkkPy[[Bʄ|> J{Z}F:<_H]ۅlL^@Eh%!p;S%ք0Xf_XE#v6xktCSbPco>cK1nkMS lC#jS$x7[W:HL 5Ec 8LE;<75ٽ0p}E}߽|ͱ/S"=;?y6V` |a{h?bc6@;EHrF}@sK8FjQ-bHZ'inL“=&N;ٍ+Z*uNJFEZ0/p#LBndw/ s4ؑ'&5B1zTثvo CsR=|kK(IR \={oqC=!CZK uNsJHB-EP|ߩ/7Ѵe`ZL~R~CO}RJ H)᜔*R˚1(}SfSTRWwn_*6C!rq.B7-\qwpKv,rGtok@\Ir) mGNpY3y=M^+؊Cs5**+a0h?! pR umaPS+(]z)LrIoړmtc&8NEԎA el DYX36F00 Ri@*cMg)uA/.KB 6#DϨZQc`e*q+9/yc~C\XO/r &)˽Jq`㌹#Wm'ܾAP_[eЖ|.BBa &%b傋IaE_#dCiZCzxOմq h[7]}TMVPykh[J.F|:X9m1+a)e*v̘laѭɹhNzMӀyzzz?G?EDqZ6@9C$D"d>.tpU(ywtjل5^m0V_eTp!|Ϗn8Wsm1WQFuѨkFiSEs`uE`R:$@=:Wԣ 0u$'; F滋w>^_k^Jz)ۡ9UOs|C_UL a!ŞƄZ6Dxr$clgRemD{e( chA@`9G|h&+R}1 І{eUWV*%NVvD ԗ< Q%aOӞTǰ2!nQ\0_/HQHnAGTh@#-wttG:Xo'}B=8(;h*̴b ғSV|_beqⅸ!6 tu k{ѧ>= pqIfur%Рhw,W:Kb@,-<-̥l:rA1x~anK'IW?τ~|A&\~z|o.8-ɒf>|]kp]IpVnQ6)6ͮQkQ+"q5z+E8zȨgVz3\q}W9!86|رc;;:(J3q1x޿oV^>\ַ(hYrh|}=tT[,qGǙNԂ{@vSه 50?]m["۴bTIaArł'D%J^Q. 4$ۢJ%/I*{1R `&mEtOe},Z#1 ](+D.\N./+amܘG W oXds2ynHQu*Όீªz鉨J,7Lt4`dz_EmQfdnh+_}j0+3#o:ZP)U|I)?Rs\veK1c.htqru|Ӿ?掻ueYaxé_O̽{2qMFzB;&]1\o" K{_~i^RJ](]. d[:FøS(_7 ,L3g:mE(nlD\F'4%^NyJ^;fCڌ/ `{|-HnO(jd3jgzkcwDkePxeiJ[CYBA6J铸ג,a g"n蕻w h"hG1 w~7`¶+桾` urB>OAD85ZŒOjf41d ۳gϞau+aS)Qg-]pќa \d47 b:%OLR=Vf^9<7,Um<2_P<@-qpfp.l ^{(mv taǞ[! ,?De펨q&TdQm2_e8 ;WV38*!IJ8H3?8P]m ;&tQsPO댫:{Dr89#b-憣SC$5IkZ@$j pX+iǚ!?=b#,Bޫ B 0N`6j^!9]|GiU KR25EɋU"be5i2al$+Wڋ >v]zl|,^8 M)~,^; s;STY'KgJ>]V6NC.r@g٬ѡj{\zͫ*5}/sp8YĸhN q,L6E;bwsuWiO M궩n{Mr67ÖhT,luH:߿2J 3*!Ľ ŨeYUĶ\%vֲVݿa}{4\`bt./f.^LptLS#*J X;4: k7gR=*VV?7ptKgTI_`($:7t Qu!$k1O~s2m_ԐF>8ʲL}}XƘ@QWΌ/sfE=n'X1@/D~y>o|sC?.N[e>@7!h&$x;ͤhX #|64S`JNnUe5wCU˷z+kSr451 9*cx<0W_\>7?BabX n9-WL Fwx:,J=Y~Q`pO%.έβ g,f)% Fy8n3)g73z%`&.,=[ʞGCn퀭G½@ڏRLk¬'I G\%,+Cp[~ぽNz`;oO9swcdJ]IF5&Pn Y!Jy~[}В!NV7сAN8~q&ٚ}9=P"y,)X`L=F?v'^Rx8Iia4EwSD,bIzN%% 6rOK`h1bg*ty^u(fש:#8UNM3ZKϊEꙁOm6ۻǪ y؉=֮}.wVYިbtC'ݳ{L@]->S3i66k9 Z ^A> ?6fñ!2OV]-%%EJz('@0S)DURUDH"k7V]_e]o2iV.!-cO`uHT{H2CD^Sm3C53ǜn%\5냐TA.3CmwR +Y\"VCT@0QMոo4iyp(,0dWUE{ 't}I2;[# D3iSj0*ހ1fY XZ.96 ouiDhvkiu ,qvwSĀ7Mz f=zxz@3asQ({W*mD}u—PU)TJsNuQCraS`I>YK; RG{{JV_dWDZs*t ṹ*_nPƼ,a&Bݦ4㪢WytVG(ѢArڪ¡苉0zGDc-xl(<9۝pC&#jY4jYv5tvӟ[)0`|!0_?>/Ǝ;M6SVjTx:\έ; N8GͶ_[Y@t4B;xBkO0`.?G^xW_Le57_ u]? 7ֵq?̯C|ixǛz%6WGt K#t[/G=X Y.7{' lm3gVf],11nOMu  /ބ~; 9>Lbc;w\X r`nBRkOLfQ,N-]|tV) xW0/y|e38G0y Ts4;vgpjDR0sF΋V}Ufmo!jHAKt9g/@1hbDlmm}y1F8rDq #Q?cjOE5nrhi"n8DJ͚5 r$u) c^]dzy[V*e*ryβJUu*ucbCJ4-4t\r!\(;<;Z6vk 3DT=a}TJ6cR!1)S|-QGS]'"E" u"q;|YmCm~BCuq1)ҟ YG@3B|ZC4=Vi"L6,eq >4]濂EJUW$RO=zzfs_/RsW'Z;1ttNW¿NMLjK(0 Axc~?7yù vҪ2\$LQ% Q5nJC+UR%PPJ2)S.+jmY{e^ڲ6ԍb&iP[dR2dMz2{׶e떥U?ϋɠi.Ɲx ]A1E*;X3Ɛ:0@FMx,p>vPԮء j9\ |O$=uR?Jiȁ y<r!8_nMB\YZxo.O1sܤ6xoEynOgmc6a6D @tY:ڨMf Y3VK'#)uܺ\ͥϝ&ollvܹ?/p6>OY- F:%%cF%F$,1xeRqd~Q3rE%[zѣ&=ѾrR|d}ݗ3g΄2\?RJ/`U;֋zWt`SxvrʃaG1CMwvQtzz`p"9I#}tUi|.%Nm {&GҒG $#gG>_%cN0fp0wf%wLt~LwU|F6EفѨ[àIJrbѡ,/weRx"Q p;-/2ީFkJ=?n wm`)` : g@-`rgctRnBF)oSvY&k˱$ j1 ((G 䴿OC ,Qu ]G3]r/!U(;!ΆÏ"$2<"QzhET a mR DŽQf~PTIFrzatz0m VY(}V ٴa nеM%Hg%t+H.rBioqa(dYiR\#cR6ǨcɔͿSX]=pFÔڥYۏbl%Ua5r3JZNJTZ)lLx$ǩQM)jx}EńjLfnߢkFuf.7F.SfJL`vι]ow\NزP*TBw:ǔoEq٭" %8::(aNפ'Gytťn{^>YYi/A=At^7`/t]wVk5߽n?||wwA1"fFvObgf#l<9gc 3K``r?jZ \H,.Y(04Q _+|m#j >j*NT4>6pr(ab&rnd7&mi{H!rݑN s%{ws>NAK5 CSͳŽQ"h(y$Iq&&2MELኒn\Lr9RȲ⪅$JPbVa3oH2Yu͍ \%` %[o%(3;[$?n\ * """k7ǒw]8SAwR*:%˪`ξ{>]t_z<9TH0o+O`&_ߠ{-f{e֎DS=(׫r/b+ UdCU2+BU$UB|6N<^㯘˜q⸮S9o0(,o@c)R[+CxkEP7\sc EO9UֵwwCLd*f&uL\l/Vc5)؝6Lr;;jgDU!;]~—Yuqlߩنy2Va{vvz7Hz=ҷK9d#YʺQp/\Pz1Q0ԙ۱ Bg[PVUMi1_pBy \"gb1{dH%uřx'E4Ρ>AYd=g>ȂqQ6 Fq0(S8lg18E/tBrG$$Fbze~$bҎkck:ێڃ|88CT8_cibr(]4a3 {֋^nP2$. 1A#`3 E7ɓeYPwA#v@s.lZ'Yj`@L'톊lZ+!6)3qV< wTPpUW?(R'0(e E1m"/n{kR\*ɩzyTӧM7ӗM 9Haog+/`)-g$i3`쀈(6eU 0-,bF}kh bs☳\jqfa|E!%vGUO C_?s-İl>]׈3ͽif*v3VlU-Vq$%+4sdGaC|8w_ f"%/oK8?LLŔľ/ZpQ||!MHnf@6:n'xO*<>kDa$//`t5LWV1Up]w&`L8&ih"gvMv^ ;ם$Nqy[]aI|qR~9z,VEb^_m[?5/g*"2fH2j==0iN{r$\}30I(zE`i\0CƧ6PK(-ꦱѡb6xՋߔpH8IKnQb[/ƈQ"sLC0!XF^lb]Y9¸qEBk&l!l ӗJ0 1G!WfܽBa'ħ(j T^ H۽ǻҪr Pˠ89YYv2NT?:-&( QcqT Vu{轅z{KǏ{Br [9XKᆲ'a ;S'AB#/kO iGۛ>ӟOM)CHl08Ǟx$%R(UX0Ht:m/Y #RSO *:IZ`1ehb =|]ns yHK_4>wP!Vs(ErǺYQrk6;3u}M;DFi cGPDiO͹݀Ge$EG,`(/̟ K鹹TYh)_U\M`&bU\]l3[Z~z:t.qf[ R:7Ww HRhpl5[R9ڮNђi֭mw}Xy+qhNv@l&}zRo1ؑ"ي\qHq@J;`MqqtwEc#冉q%գA;#5]s y J'atɲ۷i x:2)TvYOFهC?W &Kof4N?,Zy6 (m`v5Ӿ,"rƴZ"E?wOuZ+sw'\=̭CFǽK;%a (w\@Y!g#I e' mؒets~^&77΢[ڷ4w4ܷo' /FCJ78wRrbWn"8{#[>NI[a*IGIU3!#ч|2Uo>q딱JBDbi)vPQ=pʶc{]ӵm Lo~y*Q;W}4roq4sɺlSsy۰seV 7릙%+딪)8`oE_JhY+JM¡T"8 fL!~0=L> 33݆Nm%:UjA]ٵ{fٙݻV 2S-^LgM97[|j޹)ۄah͡.:Yy̩j`jg^hqnt5 z3gZ @5>~ޗ!0q"+oxj\F^Ǹ^o4 I|J%{[Khb5@"+Fh0Ȼԡ0> h@p03.ۯ:r__L͡(My CDVLj|Z#\/$qgj*X+n\Qt[Z*]=w"%) ]E,-"'Кp~f;N_;f.[`y6/Xe&y3.@,R|TQpizG9q'emB1A|CDoFGZJID ;*4LT/dc uKn9i_ $+$q. C(rEQ~1àsE q7Ĝ_+\F=,֧'>޴|0GQaxP׭* C XQ`+`lֵyjQ"1WU)絖[7't@pe%ynl%9ƅ(CQlm^o$eMjh? c=7yo#KjR=.u"*RGJA렘#^1҉-NZ#: t0Ս{$^~ak Y/K3W }0"XꡂtmK4/AVo4MuJv;xKi¦}iSuX }-AM "|ԥG׶ӴqP(+ކPܹK3<')w^{fUzԔ;lʚi&HIgiƏ XhZŭ 6X3iZM(q@g/!V~-,F*NHqȹNΠ;*j کrqnGic79P`rq?QEz/nJƻiϞ?FCe~hk%\Pӥi%^D6Rx'fi($}/,.&Պ3 um )θG/z:ΆgZ,n#Zsf@>o@I.VW:ȰQk&>SmFTʺ"$Ta#Ѓ- k$^g2{5 W=,˙wf_᝼Klmm}5G!4_>gAt. 7¢W߸(uNH ApFsY`PUsj)/!U -uQ&Id t]'_SBuXB_͍-_lsc?Fq2M.|W_3}t+uc;(WϵǾo<;ZpkZa;2F5B-l+O? &E J3_C-^gf$@k t:7 ֮EΥj!A1XR#,f%gUD+Q  2]?\AjWʎ{Y5ƴU6D%ëHFŽN֙ 臵]FVvwcW4:qN'h+.r\_[E:իFt(o$iL.T 0W`6V'Nt#!˥xr~"]@0~dO#?ITmuE H`5%8;U@y 8GdO'A;h/ sk _"d&:S5%T+01e-˾?!i]w>c! ByPj]$tf#" [ҁK KLc׮sv횘 ea ̉RC躮R{r ]Su˜LR.c\.'#% Qö (BϘ1+ZcLgl"WAU휤i_oj<6ma7*`y۶m3',=> /Eǁos2M]J3S g1h8n/hؘkZj0l8b[e]+&p8p8+:QH{LcI>L)1)UK㐊ŷEK䌝tfs^udk+mdt$Y$}VJYh9fL4ҋW4. tڅiX R5|e7jTZVڌFW{n]dx["Vp:n l`ʅBp-g&'%pO(| Cd@ A}%oju͂yP P #`{l1(Aɂ(JwP*@ɂ2A(~P> *a@PP 5 j߄: gA,h}!7o& x? #>0%hVQhڜv>hw. ^n=z3< (Nj> _{/ r xa&`P_ afQ]aN'`LƮq[a&v@OL`f ^Ԁ-nX`|X {aI !,V|X[;|~?'7{0ℂsM wq l [Z8lÎYN/1ع"ys= `)A;CVc ',8sN8!2 Bb%\+6n} *pH7uƇچQsCԱr:QjE/Nj>:>nU' ܅hvkD}Q?`AU4d+h4Q^4:7XCOD:hrO4%hzW44@yh-bZ -<3ZfE˞^r+Zq Y蛁VV{AV4~M_e%*_oI/Z m\6Ah{Cyhv&Q$vEch Y(DGOС&P(VQ܆7a:EGF#Os8DtҌNS=vtYG盠qt.E\]qpkvt-эwЍDz[ t JQ2н0=xѣJE(zBO艁@O t\tbf3o0k:Uy0ys`(gr`1h`0X Eb!,5,~KsdKsTB,K2Il,7 !+nJ?V=`X`?Xw +` 6 l8Flo&Klv'̂BOl-C;N)sn{ ~{u{ 9}`[3`=8xpp6GspD#v8* N_8z8 NV58%NyglY.8=8.t-pQ\%Sp\Upe \UWp \WןypS\71pܾw\}pWܽ`B<# x4%1x x6;7xq^Wxa]o; n 8 > i|:=cgp8؏4Ϋ8oݏ8Sg/!qqw W'D*D/r#yG1{XQl^lGB(T=*JQt#T2*π*P˨qT<< U Qhj6C5OZPǨveT{5չG&!~nT6j0 5,yQ0jDMZf.j5o_G-QhjjP۞]:j@ߣ!118uʂ:F.quG=YP¨Qo3ԯ6 B4> CфM|&Fє(E,Fдfhw4}@3KYhN#4w ZT-%QhY-Vhkz=ZݎGϣ !q>D-Qh[m5G;hW9;с :8 :9.:>(NF:CgnsB;t17]ތFW+kFut>Dѝ nnt߇уfh(z =YGNЋU;ڇ DowЇh17Ogu6}W+ cv9<._ƒ ĒƒnƒmXqXX XFX?6ET"bQ>,1n1=c22v2yXXXX0櫍嘍式^u|.?V`6V(++r++J^@@}\vU5Oy^55 `̓XenswukÇѲ BeP'(yE=WgP7(0Jh?AI$Gi/(c6쏲('rAy!_ 6PQ*nJΣϠYhhZMGCh#hd<|;?@w=tout 6z7ze8Tz3z\= zqjzfsvoxN_}D>>>x}}}~X~<~yc1>+i(4miVG۪юhWw Ddt1:ZCǷ!tj:}?.ރ.GO+oV=}4#5;ڍeepp8WqָZw\]F zq|ܬ n7­mܾPw܀;]ǝ.nad3 }~?5xpÇ!< <*ǎjq/ Yxl<0 lSó97xdp2^Kep8|4X#Qq#8&F8n88\LrX7=1Z 1q>3'?>xoa38oLRޯc jD`dkyLmMSC&bei]Tnm`B̧2|6.[^#w6aBc"zw:ٞt ]ї*枪#JX'5eNaE1zRϖrk0:0?րVlC^LbŻ14#Z9%`K:$O Yi'O%ǗG=ϸ}8Ҥdž8)y;,B|!ڣѠHܳ=D6HHa['z3Ձ fontawesome/README.md0000644000176200001440000001572714605637270014106 0ustar liggesusers


CRAN status R build status Package Site Coverage status The project has reached a stable, usable state and is being actively developed. Monthly Downloads Total Downloads Contributor Covenant
The **fontawesome** R package makes it very easy to insert **Font Awesome** icons into **R Markdown** documents and **Shiny** apps (or, anywhere else you need to put them). ## Examples The `fa()` function can be used to insert an FA icon. For example, we can get the *r-project* icon in `steelblue`: ``` r fa(name = "r-project", fill = "steelblue") #> ``` As can be seen, what we really get from the function is an SVG object that represents the icon. This can be directly used within **R Markdown** with: ``` r {text} `r fa(...)` {text} ``` Font Awesome SVG icons are great to use instead of `` tags + font files for a few reasons: - There is less overhead in a **Shiny** app or **R Markdown** document since an `` tag requires computation to obtain the icon (`` tags represent the actual icon) - Using `` tags has a 'being online' requirement since network activity is necessary for resolving these tags (SVGs in **fontawesome** are stored in the package, so, no Internet connectivity is necessary for that) - There are styling options available for SVG that aren't there for icon fonts ### R Markdown Here is an example **R Markdown** document that includes Font Awesome icons: --- title: "Font Awesome in R Markdown" output: html_document --- ```{r load_packages, message=FALSE, warning=FALSE, include=FALSE} library(fontawesome) ``` # Just a few tests with `r fa("font-awesome-logo-full", fill = "forestgreen")` It works well in headings... # `r fa("r-project", fill = "steelblue")` H1 Heading ## `r fa("r-project", fill = "steelblue")` H2 Heading ### `r fa("r-project", fill = "steelblue")` H3 Heading #### `r fa("r-project", fill = "steelblue")` H4 Heading ##### `r fa("r-project", fill = "steelblue")` H5 Heading ...and works equally well within inline text: `r fa("r-project", fill = "steelblue")`. This will appear, when knit, as: ### Shiny Here’s a **Shiny** app (from the [Shiny Gallery](https://shiny.rstudio.com/gallery/basic-datatable.html)) that’s been slightly modified to incorporate Font Awesome icons in the text above the three search fields: ``` r library(shiny) library(DT) library(ggplot2) library(fontawesome) ui <- fluidPage( titlePanel("Basic DataTable"), # Create a new Row in the UI for selectInputs fluidRow( column( width = 4, selectInput( inputId = "man", label = tags$p(fa("car", fill = "purple"), "Manufacturer:"), choices = c( "All", unique(as.character(mpg$manufacturer)))) ), column( width = 4, selectInput( inputId = "trans", label = tags$p(fa("car", fill = "forestgreen"), "Transmission:"), choices = c( "All", unique(as.character(mpg$trans)))) ), column( width = 4, selectInput( inputId = "cyl", label = tags$p(fa("car", fill = "steelblue"), "Cylinders:"), choices = c( "All", unique(as.character(mpg$cyl)))) ) ), # Create a new row for the table. fluidRow( dataTableOutput("table") ) ) server <- function(input, output) { # Filter data based on selections output$table <- renderDataTable({ data <- mpg if (input$man != "All") { data <- data[data$manufacturer == input$man,] } if (input$cyl != "All") { data <- data[data$cyl == input$cyl,] } if (input$trans != "All") { data <- data[data$trans == input$trans,] } data }) } shinyApp(ui = ui, server = server) ``` The **Shiny** app will look something like this: Please note that using `shiny::icon()` in place of `fontawesome::fa()` will still work. Internally, the `icon()` function will call `fontawesome`'s `fa_i()` function, which generates an old-school `` tag for the icon. ### Installation Want to try this out? The **fontawesome** package can be installed from CRAN: ``` r install.packages("fontawesome") ``` Also, you can install the development version of **fontawesome** from **GitHub**: ``` r devtools::install_github("rstudio/fontawesome") ``` If you encounter a bug, have usage questions, or want to share ideas to make this package better, feel free to file an [issue](https://github.com/rstudio/fontawesome/issues). ##### Code of Conduct Please note that the `rstudio/fontawesome` project is released with a [contributor code of conduct](https://www.contributor-covenant.org/version/2/1/code_of_conduct.html).
By participating in this project you agree to abide by its terms. ##### 🏛️ Governance This project is primarily maintained by [Rich Iannone](https://github.com/rich-iannone). Other authors may occasionally assist with some of these duties. fontawesome/man/0000755000176200001440000000000014605637270013366 5ustar liggesusersfontawesome/man/fa.Rd0000644000176200001440000000755314605637270014255 0ustar liggesusers% Generated by roxygen2: do not edit by hand % Please edit documentation in R/fa.R \name{fa} \alias{fa} \title{Generate Font Awesome icons as SVGs} \usage{ fa( name, fill = NULL, fill_opacity = NULL, stroke = NULL, stroke_width = NULL, stroke_opacity = NULL, height = NULL, width = NULL, margin_left = NULL, margin_right = NULL, vertical_align = NULL, position = NULL, title = NULL, prefer_type = c("regular", "solid"), a11y = c("deco", "sem", "none") ) } \arguments{ \item{name}{The name of the Font Awesome icon. This could be as a short name (e.g., \code{"npm"}, \code{"drum"}, etc.), or, a full name (e.g., \code{"fab fa-npm"}, \code{"fas fa-drum"}, etc.). The names should correspond to current Version 6 Font Awesome names. A list of short and full names can be accessed through the \code{\link[=fa_metadata]{fa_metadata()}} function with \code{fa_metadata()$icon_names} and \code{fa_metadata()$icon_names_full}. If supplying a previous name associated with the icon, it will be internally translated to the current name and a Version 6 icon will be returned.} \item{fill, fill_opacity}{The fill color of the icon can be set with \code{fill}. If not provided then the default value of \code{"currentColor"} is applied so that the SVG fill matches the color of the parent HTML element's \code{color} attribute. The opacity level of the SVG fill can be controlled with a decimal value between \code{0} and \code{1}.} \item{stroke, stroke_width, stroke_opacity}{The stroke options allow for setting the color, width, and opacity of the SVG outline stroke. By default, the stroke width is very small at \code{"1px"} so a size adjustment with \code{"stroke_width"} can be useful. The \code{"stroke_opacity"} value can be any decimal values between \code{0} and \code{1} (bounds included).} \item{height, width}{The height and width style attributes of the rendered SVG. If nothing is provided for \code{height} then a default value of \code{"1em"} will be applied. If a \code{width} isn't given, then it will be calculated in units of \code{"em"} on the basis of the icon's SVG \code{"viewBox"} dimensions.} \item{margin_left, margin_right}{The length value for the margin that's either left or right of the icon. By default, \code{"auto"} is used for both properties. If space is needed on either side then a length of \code{"0.2em"} is recommended as a starting point.} \item{vertical_align}{The vertical alignment of the icon. By default, a length of \code{"-0.125em"} is used.} \item{position}{The value for the \code{position} style attribute. By default, \code{"relative"} is used here.} \item{title}{An option for populating the SVG \code{'title'} attribute, which provides on-hover text for the icon. By default, no title text is given to the icon. If \code{a11y == "semantic"} then title text will be automatically given to the rendered icon, however, providing text here will override that.} \item{prefer_type}{Chooses the type of icon returned if: (1) providing a short name, and (2) that icon has both solid and regular types. For example, using \code{name = "address-book"} will result in two types of icons for an Address Book. By default, this preference is set to \code{"regular"} and the other option is \code{"solid"}.} \item{a11y}{Cases that distinguish the role of the icon and inform which accessibility attributes to be used. Icons can either be \code{"deco"} (decorative, the default case) or \code{"sem"} (semantic). Using \code{"none"} will result in no accessibility features for the icon.} } \value{ A \code{fontawesome} object. } \description{ Add one or more Font Awesome icons as SVGs contained within \verb{...}. We can optionally set certain style attributes. The \code{fa()} function can be used directly within inline evaluations of R code in R Markdown documents. } \examples{ if (interactive()) { # Create a Font Awesome SVG icon fa(name = "r-project") } } fontawesome/man/fa_html_dependency.Rd0000644000176200001440000000237314605637270017472 0ustar liggesusers% Generated by roxygen2: do not edit by hand % Please edit documentation in R/fa_html_dependency.R \name{fa_html_dependency} \alias{fa_html_dependency} \title{Use a Font Awesome \code{html_dependency}} \usage{ fa_html_dependency() } \value{ An \code{html_dependency} object. } \description{ The \code{fa_html_dependency()} function adds a \code{html_dependency} object into a Shiny or R Markdown context. This allows for the direct use of \verb{} tags that refer to Font Awesome icons without having to use the \code{\link[=fa_i]{fa_i()}} to create these tags and also add the \code{html_dependency} to the document. } \details{ The \code{html_dependency} object is created internally with the following invocation: \if{html}{\out{
}}\preformatted{htmltools::htmlDependency( name = "font-awesome", version = fa_version, src = "fontawesome", package = "fontawesome", stylesheet = c("css/all.min.css", "css/v4-shims.min.css") ) }\if{html}{\out{
}} The \code{fa_version} object is an internal object that provides the released version number for the Font Awesome icons. This can be inspected by using \code{fa_metadata()$version}. } \examples{ if (interactive()) { # Create a Font Awesome `html_dependency` fa_html_dependency() } } fontawesome/man/fa_i.Rd0000644000176200001440000000503714605637270014560 0ustar liggesusers% Generated by roxygen2: do not edit by hand % Please edit documentation in R/fa_i.R \name{fa_i} \alias{fa_i} \title{Generate a Font Awesome \verb{} tag} \usage{ fa_i( name, class = NULL, ..., prefer_type = c("regular", "solid"), html_dependency = fa_html_dependency() ) } \arguments{ \item{name}{The name of the Font Awesome icon. This could be as a short name (e.g., \code{"npm"}, \code{"drum"}, etc.), or, a full name (e.g., \code{"fab fa-npm"}, \code{"fas fa-drum"}, etc.). The names should correspond to current Font Awesome names. A list of short and full names can be accessed through the \code{\link[=fa_metadata]{fa_metadata()}} function with \code{fa_metadata()$icon_names} and \code{fa_metadata()$icon_names_full}. If supplying a known alias to a short icon name (e.g., \code{"vcard"}, which is now \code{"address-card"}), it will be internally translated to the current icon name before returning the icon tag.} \item{class}{Additional classes to customize the style of the icon.} \item{...}{Arguments passed to the \verb{} tag of \link[htmltools:builder]{htmltools::tags}.} \item{prefer_type}{Chooses the type of icon returned if: (1) providing a short name, and (2) that icon has both solid and regular types. For example, using \code{name = "address-book"} will result in two types of icons for an Address Book. By default, this preference is set to \code{"regular"} and the other option is \code{"solid"}.} \item{html_dependency}{Provides an opportunity to use a custom \code{html_dependency} object (created via a call to \code{\link[htmltools:htmlDependency]{htmltools::htmlDependency()}}) instead of one supplied by the function (which uses Font Awesome's free assets and are bundled in the package). A custom \code{html_dependency} object is useful when you have paid icons from Font Awesome or would otherwise like to customize exactly which icon assets are used (e.g., \code{woff}, \code{woff2}, \code{eot}, etc.). By default, this is \code{NULL} where the function internally generates an \code{html_dependency}.} } \value{ An icon element. } \description{ The \code{fa_i()} function creates a Font Awesome \verb{} tag and not an SVG as with \code{\link[=fa]{fa()}}. The primary use case for \code{fa_i()} is for legacy Shiny applications that use the \code{shiny::icon()} function. This function is called within a \code{shiny::icon()} call and all HTML dependencies to support icon generation are hosted in the \strong{fontawesome} package. } \examples{ if (interactive()) { # Create a Font Awesome icon object fa_i(name = "r-project") } } fontawesome/man/fa_metadata.Rd0000644000176200001440000000243414605637270016106 0ustar liggesusers% Generated by roxygen2: do not edit by hand % Please edit documentation in R/fa_metadata.R \name{fa_metadata} \alias{fa_metadata} \title{Get metadata on the included Font Awesome assets} \usage{ fa_metadata() } \value{ A list with metadata for the included Font Awesome assets. } \description{ This function provide some metadata about the included Font Awesome assets in the \strong{fontawesome} package. The list that is returned has the following components: \itemize{ \item \code{version}: The released version number for the Font Awesome icons \item \code{icon_count}: The total count of unique Font Awesome icons \item \code{icon_names}: A vector of short names (e.g., \code{"npm"}, \code{"drum"}, etc.) for all included icons \item \code{icon_names_full}: A vector containing the full names (e.g., \code{"fab fa-npm"}, \code{"fas fa-drum"}, etc.) for all included icons \item \code{icon_names_fa(r|s|b)}: Vectors of short names within the regular (\code{"r"}), solid (\code{"s"}), and brand (\code{"b"}) groups \item \code{icon_names_full_fa(r|s|b)}: Vectors with the full names of icons within the regular (\code{"r"}), solid (\code{"s"}), and brand (\code{"b"}) groups } } \examples{ if (interactive()) { # Get information on the Font Awesome # assets included in this package fa_metadata() } } fontawesome/man/fa_png.Rd0000644000176200001440000000436614605637270015120 0ustar liggesusers% Generated by roxygen2: do not edit by hand % Please edit documentation in R/fa_png.R \name{fa_png} \alias{fa_png} \title{Create a PNG version of a Font Awesome icon} \usage{ fa_png( name, file = NULL, fill = NULL, fill_opacity = NULL, stroke = NULL, stroke_width = NULL, stroke_opacity = NULL, height = NULL, width = NULL, prefer_type = c("regular", "solid") ) } \arguments{ \item{name}{The name of the Font Awesome icon.} \item{file}{the path to the output file. If \code{NULL}, then filename will take the short name of the icon and a \code{.png} extension will be applied.} \item{fill, fill_opacity}{The fill color of the icon can be set with \code{fill}. If not provided then the default fill color will be black. The opacity level of the fill color can be controlled with a decimal value between \code{0} and \code{1}.} \item{stroke, stroke_width, stroke_opacity}{The stroke options allow for setting the color, width, and opacity of the outline stroke. By default, the stroke width is very small at \code{"1px"} so a size adjustment with \code{"stroke_width"} can be useful. The \code{"stroke_opacity"} value can be any decimal values between \code{0} and \code{1} (bounds included).} \item{height, width}{The output height and width of the rendered PNG. If nothing is provided then the output dimensions will match that of the input SVG viewBox.} \item{prefer_type}{Chooses the type of icon returned if: (1) providing a short name, and (2) that icon has both solid and regular types. For example, using \code{name = "address-book"} will result in two types of icons for an Address Book. By default, this preference is set to \code{"regular"} and the other option is \code{"solid"}.} } \value{ A PNG file written to disk. } \description{ Get a Font Awesome icon as a PNG file. We can optionally set the fill attribute before writing the PNG. Additionally, there is control over the output width and height (usually, icons are 512 by 512 pixels). Please note that this function requires that the \strong{rsvg} is installed on the system. Attempting to use \code{fa_png()} without \strong{rsvg} available will result in an error message. } \examples{ if (interactive()) { # Create a Font Awesome SVG icon as a # PNG file on disk fa_png(name = "r-project") } } fontawesome/man/figures/0000755000176200001440000000000014605637270015032 5ustar liggesusersfontawesome/man/figures/fontawesome_rmd.png0000644000176200001440000010363314605637270020737 0ustar liggesusersPNG  IHDRTG#PLTE333+ꛛfff]\]H&XFFF```cVVV999Ա`$@@@v/1yyyۢ454VQRRccc31c765MMMɌ9ÓIII33Butu===Ԅ(N$ <_ݱ??MG23B돏Jḱ124ե@33fa01(nooYh߻鮭ݚjjj31Ucx0>Lڮ̘ǎϘTC2v33pu~}|XM@/Io/k3VT41H-bP^fc\=KTBQ>e]T=a4GܹH1.?}-GW_UJ{>.V)é`i.<۵֕K2kqă{T ű̋VM{iǵԬ.0Y+Oퟶacvf8V~/SyjF0wkJZDT]|WDR^gv]TGj•hZih{kF=3|xĀweabrAe5x+ tRNSP$r׽ @IDATx=N1Q݄e" :RуDC9 ' ixLᴳ2N6MκUTGm6f- [HQ Pk֣앥UkQlc6ppjj~ڗp} Wꨄ llvW+m~l}NE?GIQuJO_jjJ8@utQ|@nDjiQļ@iv16+!l4jڈ** ** ** ** 1 1R݊3  1"U*H -R@T@"U*H -R@T@p3sٹƁ8?L1c1f5ON ب2FnH^hV`0Q幜j MfURm95D"ڡ DG}t)uSs6OfbvDҞ7AQ'CV@EYQ+~;za3D|CTb QQMӇj&'uDU6Α_j=jZ>HjRm|Cҳ% *Th5MaCSe QRh~!ӛTIyZ*S%R]UQJqF]>eT8j@3+J:A9l{Tx8I4^Tz˛xTԔx:x$QQ>լ&,HFNɂ":1ELVBZ uh3_\D&{cgaun0SkY)Om!y|A (+U*۫[U*wwJU朕Ty }iv.L%2_?JhYo!:{ Fmzi6M^Ay P8Tw b.'f's39~l0, rt-V̕*&*WB5īc MT3*RHK9V'QBkffU}F 7u|ˎ;#oGdGlI?uS9ޞ+U4炔Gp UaX" x;Tǝs[ ѴmMɶlv(ufY3ǔ*i `,7 k}ʶv[yhٙ6fPjЙ;,-_- ɁߦTWl~06깝{٪0=V#Օxk1b|md9_*b,Bs.pXRX#ej_gPp>'"wpX2ɽF>{ 6ƭ07R.ΥMh sc5UE'2+Us(<קY4& {F1_,UI*.84* Es>U~*u4y _5*h ʘTħe7h_ ߞZݱ2RuaT|wmPޘ$h17%EDm*u`.{=%^喽iw  O\z%ŀw KD2i'DĎsi-U?>j#&~TzեaPG2ҧ2HG2:T i*U)'HmRQr:CJS. U%i(Ms3Xua9,#_+UO$}GP蟜J_7kjBth̲.z |3c+=ůј aG v~^` wtDSc^o k q43mjL71;:4W_b:-KrmJ@4l)P9!BtC~9>r!W(VF.*HiȂT(,Wr99A98,_+C .X1C ܰ3$_#|o+yFh>ŊHF:+d߆%7}߃ K*ti炖Ti2<{WqhJ?wT&Qn%1+nPF)5&K$*ԷGjc~OJA2#&pRwikû܈@꼬2kZqF4H*"K9||Ti1D d="`S$>- xGV__DZ˱4sa%85k_|&cʕtÊlj8k/j |G1<(&5bF,ouBLMjLBAĹꇳYpR", =ssT X縦 4PYI(ȑ:8,_&UvMp2֥އUQ?չ}O| %}n$ПۺTס4>rkRX~.K5o8 3RUrj$ɭ? tml|h^]Jٖ麂x>,A&Ms֓蔐DC6$/`^aXnf>.rm]S`_$ڪ|^D3ʘ!Q>Un$8ȊTCKո>\ؗj,C HNm`&F4P RٲTR.5RZYtP#{=!z`۔*yMdn蟍0k矄 >?!iKdU@Eb964sa_hTCwj[SpZe~g{TV ǔFELXRQ fyXG9TkxeLb [jzv,Ud|T-C~=.(U6|z}?8-IlLR6b胧|֥`@gJ/KrJ~T6!}TU&5h(kz>e8|DRMkHu98,_+U2P7K}Cc-((CM9tO,Vf!l]964vsaW P\*"'K)s%&QVs6|A{2ҿnvJ,M,:,'^J\z>-5 <װM2M-3nֽ"U0Eoߒ73964sa_-TLum)H^CBWmKO TX R=}9xD"Mp  ے*'W͕N/r((w%50frl Ui¾TחPMPv[XpLi咺ߞ!tI67To cZM8a0-UVص+g_\>m$/. 2ְ R}[7S܅G,\פ˜ʱk*~tJ vͦTK#ӿlO.*ULlAlU|*ܳWs$\:2ct_,U[ٹ_s\` 6TI7϶3$, E/c_vT/.fk.džr2f.^Lz1zNGQ굲M"bRcJsɳ_~L#A/=҃.qwigގTK#RBG?q.o$Uƀ߲TWv0 ֎ajAbǧ6e,!R7Ţh1nУk3d>\|TZ|v((UX7NÍJ8s2 (*S=0,:UbyifYgpUBrpXzHyf /;`|@h E #cf3,$ 6z4 9d*h'yy6 n+mi.̗{KRf.p@ѥ*e w RHu@XVgz c$q䴴Zg\dG4U,jRbZ8@rw/9" UZ78E?ЦۄpSL2[' iƎT=y!9d˥ŞT|pε\&,,JſK̜cJe"GUSQ֤5yƿ!n0GS2eUNT[ͷvõv 7M͒KGa0-U/tlWx"ԗR {8 JyDu3}oEǘ&N"A -ŮѬX+'i)NүW投Y] GE4׬),=4%a(R5yW%s㚍{^V{5XN ȲTX>XjX`%)AA^b_+<v$`vʦEB( 2)S(\ㆁlzI -3HO1ȱTקT *rMdZ]W=sF /Q-E@6'\̓:?5Kyaa&[t )UV+Jw"n,"+ "l5{"{;&Bz~!\No-ڽpkiX$Uy$q*d$cpR\;@4- "R_QEP5WN4J}UGhΐj_B:RuXB SF71>xEz I}aϹ`}Ï0#+UzbMQҒn6" -"ׇ0~--υT7/լ-Bw4F*u b lSbP~. >Qvwِ*{JSUrS*!T+PR==iR`\0-du9׵LO5MߍKYUw𐊺0ZO.5ϦCJstH<~E{)PʻK=a{RB')0 uU*1kvkY̱ iX`q=V$U p֝oRZꎺ4}>䓯};KB=/Rf+S]@.Tݭ:zgF[d;6veHPwGNhv茺(²j?1M/.C*yy.[o'upڥҎ\V]z,Q Uܞ.bsh?w$cVxɎ?V/.^C@*HVz\6!$o"jޖm5HS^5(jͬcUo)wFz5x\ Ht 5*} SWKS7lDnV=N2O~Ȼmz݁(S !9CWMZ,7r)T !f om w@ @p'U*H -R@T{u,0z;J" /RT@"U*H /RT@"U*Hbj jÿW4tU&1#" " " " ": q=? q= )G%hUUhUUhUUhUUhUUhUUhUUhUUhUU`W$^ RTE Ux*H^ RTE Ux*Hطc&8wB,v0*L9hFq0C04 d)tIQ8DThVL"/=I=s4,~._ڦ0XUP@ *B` T?TQdzAv8)yaj_NwlQ{Zz;=hRIb4OˌmgD-kA Z$s* a#TO0v?=nfnwu6Ϥ m7X%SAULA{ts_"~gϦ :]P`bL]xD!!z<4XC$D-AU[b/.qΙ95:(/;sf|{ν-yVwm Jqoaw|Y\EomGC()U !iNsSȲtE\׾7>^E\1wʐ*P‹]sGAMS.d &x>bc^fc"W ^ y_K|wV8n*/[o1F E@sꆳAPHʩ7 @>_%A/ˍZ )ҌX&3igfd0mc|LOo9g(r媍o5 m6܈٥YiQd bϽRmKnѹXJUA 'Az"[hqT8DZLѨ'Il@é5`DFx :{/ FR*~ #PVίR]H,LwC'_*Y6ҿ;g=y>>eAjpA\H4ogp}KH#pK V]E+Xs$\iڡHZ>azo٤uK:N%?J5[TB$wQQKZĒlNFIKuPG:p:E yACGǂ#A+H7 V*!~LNInZYI:#v^2 hQ.?oNzh@wUT,s_R%ArOr[W5\aGv&l 6)*NAGMAr U Xŕ{a1=85YEkL*|n?")z ;&y8e0:Z4xgZ7?pg5_OwF|(x AZ.lF}u7JQ6 k@ 9*OB}juH"i ~p>fLrk-==hfA颺lLJvrk,7,VDM#{"BjuBv~\f *{07h\fHWM<^TOPT3&ե;/s(U{-iRpm\vRa\TՅ& 9*K2nv&㌃i"4E^fϵ}g}O;1c5fZZ>%i#́j=wո)w"UB"spb;TJUA| GRV @s ǂ e,U{Mk ; QX6 TȱCqf6I՞5buDxVӣu(r-ʝTӱ49a*ǎ3bƒdDTLؔ2V?Rc Ga8× CVb.U IecZ<3*^xw lijύSOfWA[Ч:wHN ~P7&ZC7*N/C++ AFiVЦW  SJQF3ũz{+`+[ );{(\7͝TQ歡'9gil3ܮmn\w5LS (% ٰXgVx* _JƌPЗ}4>QKhx\`me)&p7ڟHjM;Bgxs~Z;@J5@"7opi:y̘BRµE #U^Vȹ}Nyg^Ty֩r0 ᤋ4r6'b^Dz3vr֦=1E qbOЌc=Ė^^d LzE #!ٺ>DؾPҌphH]u&~ Y徆鼭os@'Ou:z]i8 ¾Zʕw =1lRI!08|wƎX" Er7ppe5R#\Lo\43Uwd;nCؗ2$_nB:;/HF1pkS4j$| $js7&i%ZʮeJT@T _DDET@T _DDET@T{u,0z;J"E Ux*H^ RTE Ux*H^ RTE Ux*H^ RTE Ux*H^ RT%X`4vDRT@"U*H /RT@"U*H /RT@"U*H /RT@"U*H /Rb[OcGIH^ RTE Ux*H^ RTE Ux*Wmq_Td.WC C%mR4tA D_9C6Ӏ1+dG<{pQ_*D~!)fbU[nWk~jVy1~>3x*ށ'zꀨZ "q')UQ3SȊNF/ceXUr?1};'zjߨJf#Q;S{{oT^vڨY{? IE/V."hQ萨75c O>QAxb'/y>U@JQSDITkU-*!$ĨZÉ4QMx Y/ddx\T#{fp-V_2FJ!DT,e ]t@T:3W8l3kvtRQmxD=(/01EBl꣤1ކţ*ș?nT7jڧ |TFE:+J!{批ՑV[\&B`(bKT3ގ*5@T7&|aQ+ :QuW/;~Pfw'"BOUFQ%36EUZE9?I(=ije/ dCllMmt;ej)6 eFMqA =ayeGUBxQYEa{ft:VGU{}._| *T+/W.T5 /Eu7W fPx e7/;RT !Ķ% (g?tT'<0S7j:l8ҥd:p}urq7x]GQ%)gͨDգUM}5㡲?/t۩:AsJeSVhhf5VVv{CUB)'FoO_O>tTJ/ ?2~-o P5Mp:,hT%} PT !veTf 2Ejxz /"ׅPzAj*0D~_GD55QmDv\( W"pφݴc{(o36[& ).EBއ>KyQpؿ9_cfVmj%KvDڗ4ɿ\XѿyG(Q+0KL rgV ҨD*BȎ'I2?zxx/=QT{Vb^T r˰wj{[T)en!QdIp49) _35j/Յǹu.PB&J+"8EBl*ƒ |jWDj͏J݇ tW"x{uQJV%FYgdIѱQ[yEN qXEtX]UTъ sJ!GuUYZ:| ,̔kuo{F@+VU3t~T!Н{:!!~r8@ՊCdW7r *|dNSgJcZӆq͚ I3SYzR*2 =[}~}am27N> 9:TgoĝGUd*ۧWJ!4? {bfwg7޼*A#7UϐK*L-s'*K폪#j܎}|Om5˟D/|uZfV(EHSA$*.D2mGTOuҶ;5v5¼PjbƛL^d Q=6Wi՞j'Ō:vDU30N:I*8 uGUޣcj*֦G8UM?/2CY9e*==אS[lgJN׿Ur@T Q _*D|!Ufj jÿW,2яUhUUhUUhUUhUUhUUhUUh9C<C<!lpQ DDZDDZDDZDDZDDZDDZDD`W$TE Ux*H^ RTE Ux*H^ RTE Ux*H^ RTE Ux*H^ R^ Ǝ /RT@"U*H /RT@"U*Hb^8[L$hj5$ȧ"–LDйssnjMn߾7^@TQ@T?G5 "c Yǂ? Is&efĜǨnЭs۪%2Wdx1~R]n9q̗*ʣ gsCZ i^&]S;Bӹkbߑ`&=@|)>7UBT^P jeQ{SGTuTư_( j5QUYg̤ʚS!J扦UCT):fOtISU ]nf\/ɩK} *&͛˝BXupdLg& 6iȧY~['&6~yFN?d5- |'UA(HM d Hhb*u/˺]3T9Ií{ߢ)BEGI冃,ђjft>:LT9wCLlTc;j|]TȒћH-`"MaʟlpRoרּBEG5W˴U%ct!vB+U-tO.,3*M)i@(Llr!b\I#rQ}T4u~QM*V e_F b{sNV|@ud+ YeTMcDGj{B.8*ςZWp6MQݪYQ5sm`"0~sB (0wI2 Lɪ_FUZyd1!Bz2Wz!h0oڕ p4|B(1Q7MB݈:*0Xk0MF׿!Frը~U-BNjno*qm7wx4?%l[07#|@wŽ͏ɋ@'63e1qk:1oB0!F:T!F$;sGJlL(o,LXh`*`.v|.Xj_Z:;BϿ TqQMtGj'Af]U:@mTdΥĭ_;wJtkhGQM4Skot&2P(F!\qT*U6FO4U|XT= Oӽ&UE\wc3jMb@K"T2 $ /P{┬1!Jz2?7DUKAQMtI= USfwH@Q=k@L)lW61!FzZUgm%WSO:̾xncT=aJHEXԚyb Lta`^DL$j=:] pF!qT:x?~=*:)̽!+'㿎'}l\,vD56v"9y_Fu8H? zk: [sw;`n;8>ohQ1Qg*BPnkYoLP"L<\Q+7_M1M(~DT¨"/yUVO韃˴|T aRƭ\TEbmKT=?}*B-Ϋ99UE5tzp6*ɰ2U/3wH+yU[?57*)*BVUfG5WHGUKF Rs3Yﺫʚe߶~_,|h#KT} W U`Ώ{"+9~~U*f ٢vbOܚ;V [DUE%B-BȕEU8|yUW8??fG&T)Jz gn)ب^WDkҕ"+9>YվuQGUʜlGEU{&,'iڶ) "ՈA1#;٣4╵׿6tw"1}'v  VZm mWg6 Ԑ*ݬo!R:v~=s{Z 2l(Um0/’DT,hg=om̞Bߍ50+O\TqD/z"K-EչӇog߮OE6#{?N6KJDU%Ti0)' &$ت]$-OKMBd( ɨjBQMb׻@0nUٰ$ kB!I C]:Dj| Qu>k kny!R4ɂn)u_zǁ|>hfgW!FRQ=Rif}T PzOw~saҘʅ&XyzpnZ%g[oQ8N`z݁byFkUl%l%J!\HPB X Zy6Qduw3p03=BEQ^RұYz!`T%G?f,kBE0s, a?-AAMbSmA_;{!rs?7mFuRo?3;%զM`YO"\%զmE UE0ڼ*v=k*@iD5hڌ>GTC|8 gUUmfsMGT\,wwWCg&J$ @, **" @, **" ˿8yT{'*ˣ$ ձ i(E Ux*H^ RTE Ux*H^ RTE Ux*H^ RTE Ux*H^ RTE_.Yq.y  B|qQ{xEhrj*h  ^ *BDQDt/P^_UANygzq/*ET@T , aUU@XDD" QQ**ET@T , aUU@XDDrQ8*O_aGiv;Of_S]PL 2:k=+6P{T$Ko2>0<}{|8y;8}yoqފ|+6PkTm/d} n3MΊ(]y)* ?ף͡QOyxw|[_6^;ڽqnT+ը~ݍ*6gψШN_ZTE,e#C,fKţ:79:Ogy(a+u l4_[6e-)6҄5M!#AdiÑǗIK_s[SFƩDvwOJ0ϋ_J{wQeL2 9,UUQYl=Fuڢj=ߐ׍]LTxC%'r3#|fc6!&]զw\ꃻ*1PكU}QQczhD, ;Du:|گuNJ~ĨSqt@QUYSC 'mPj~(A)gڣj/x׸|lbe~h\n4;{űy151rY+WliqeIyKu4/fFd:8-Qd0̪o4ϨZ[#GvcwYrݏqp‡ ~-X1/5N~8?P;LcK)EkcDx1hjڦKa:U[/}8nLc4e,g]Ĕ6{@ؘl((ɚXXRojjD ؜n$vT]c[1C8'܍Z[js(ubSbiBrT+-RZ2 S,Ȝ%oen.}׿ $#tT]_ZISiNaQUb+!_Vy' U:^&ITdgg:a*ǐZp32P,HzmvA>pğB7gT^m`&v"6 E3UH)G5tT7L>@&1G=]|Joq!fMD|Q}E W'lJ*Zn"7 q UN-Q^[%_nZw~X+x,>U!6Rj CMQ5qQ̴#.} f4Dz DC*X3/ʎwA:o[%m*|2RI7D@T mOՑxMfxQfIU{LbTO{lѾcj+E2bTy#.!a[Ck_;%u LO7QwIr ""CTTinxNSX&kh4@tU9;ImSOҤ k9 Q#muQ:jί QtzTv&j\^n X4LCkخrF%Qu'9=$]>QQ}S*ԣbU-&͞r߁TG:F̹Y3oߨs-ٗsvk*Q4"9>3cvTlߌTGU\`}ݬL~9{ yp!ƴq5Gu#y .D9| Qhay|HsTIL>>0Y4%? oWjBUFU&6$҆jY5m>"$YDU a ^oƨqIDe1\~¼KfOއy7MM:6o@PUdj1F|/!_ẎBXP{9QI/R33c!V\턆-D1aBH*J@I&!R񿃥S?V+565egyNQG )C³nDuC&&;3;r&4*16,tlUr)Tۙ+=L}T!ȧMHވ#UܕKzT>RXhՏlZ߄|< ҉ڨl&^^U5i* c~㑻c# ݘ8hv.5H]tAd2.?25E/)ĸ iBCT'/&RJ>)ÆhRUrԵb)qn)W*KeCvEMT։"7y @GT^C`9$3C_ld(/Ū+ WO; 9Di oU6s#9mAqny+;rw  jl u#a+<,>f ks˗_[ҙMȝ㖌mD^[8"EmO5h}}~`E{wPp i2-CAaXƢ/ ɢ(u`2ŲE:ݖp9mϾ OP{F|noU%B{P{Wy~^=O=Qm~]'dz  P[9 Ӻ ]8^]+x9hQ]iE|<_4.FZ2CT@T - iUUH@ZDD" QQ**ET@T - iUUH|W$TE Ux*H^ RTE Ux*H^ RTE Ux*H^ RTE Ux*H^ R}8p &]"jl 6Ē]i0GI$ C j("p*b{Dłc.;sɮFn,sƷ/@T-*2pPVO̡ɽ"Uܮ8sTWu8ݢT!7KQuy2R(1Mp+L3}SU=atg/ӉU'Oe+I^YN'H4YKu3*:wҹMn*CT6&>݉pT҉?jUctZ+U Q $B_#6DfPRjj<ǯToF1?U{<"qވTVKR$n7QEqCFT_?UG˗d\XE;LTPUgV5\Er ?jP]n6+ZAc9A:Wמ= ZTDc~ݣyb:WnYܽdXlך7?&ufך%% ?9QCwߩ{~npӵ١7㱴kQ%&2MMX kT&/fo>kQ:}ݹ bV6Sԕ܂njTG՘_{<ZQƉjM’1V%9ZavjӫʪIg/l~ёn*^#[+vYZQMI7NXT bQ]=:=VDӃmzoGh 9_n}'n=ХqK R~Eq*;QkQ%*LxT 2II6V{vo}^VS{xߵf&ԲM46'Q,龄 'c9>DGTQJT\ՐJODꦭ|TnOoӟF2Q֘3tz:=u k۾mn=U;k3Y7!3/CTQݭ*Qd:h&kkQ4ZݙL4h&}[)xg>!bFc8lQ}0.Gl6J *# urF5bMf^GU b4Srm_b`]|)٪ƚϋHyڼpĬJ]G#`%\H]"7xƥ-SFSJ.&٨g(-toO_{]յ QԋT'gO*#sQ9BB2Ϋ%# <U&'׮թkQݐjպJD,DU/I)}Tx<Q=g6.t>Z Se~(-4|q_xX o6 /&*} LM;nZ_mz}Xk>}MzLwjY֪7*YXQftUVE ќZ읬Zn\ Mu|@T+q$CTfH =Rʬʡ[֭U1.e\\\?!" t͚Q>IiMaouZZgT"_h;߮yJf8ywnQ?*bRě@(s|TѦ6v\j]Q#Yzō6{V-Du-e# T]OwS*7T#&5QH>>A6U>QTU MUao#g#죡eRI*nlb%$mD7{wDq/xFMQ+ x$Ѽ0j5DDZ,)FR "A(zT+j>(xQ|QDx+VE/TQǢ2jjE P6d.3y^!ۨq-^JT"L= v!YbN*ϊՠFym5;{ Qɑ uKTP6Q'Pk8煴JV?SvpzRjFe\BڴdU ~Zf"CL1*~ V}6ʽy Cp֨ X GgI&ԛ7ؼP}'_.\I^=ijf&ssvQRurOՐREI[x&,p֨v)3qTU/:-^l.xuYû!@E)CJuTM}օ$\QՕ{J22NbmWTεju*0ꛪ:uOi:҈#-"nv&檦~&_?Y;x83UB4T+*#Q44/ ߙv}O&|MŤDݣ<m3ni5̭:{J+gȇߎF;^Qu_aE%`D椫:i!UZThּ>=׭ wjILT lUZ ksQe>Ru+ubҪ:DQҬ.bI@eh&CQ5Y?WhOU r<-+*Qܐav DQէt'%b#D3kUU^wrLWkTw^׵l DGu_*"i_YL]:bjoWﺹc^wT^S^.כhKJzjLfu#MwwcS):% I (S藸ی Zo( :Zap̸*[nRI &;~\˞pm ?RW&Ke>Q /˄i+LTQcOځ]T@T{5W0??z7C_i=Gv&DQ-* [UD *@nATU܂|c[OcGI Ux*H^ RTE Ux*H^ RTE Ux*H^ RTE Ux*H^ RTE{gSeyZBЭ{/• ؍XVs0h1r!gLg'ƦRhꚃ-50w^;ӅSXVϹyw Ub&,bMvf*7,̡3 (Dŏ|iXWJN[;#Y,5q3nٽ=ٳO (D͞?*IOUՄƬ1w$"5ADē"4ŚLoP}j>^_zv5K׿O7.u`>ZyRR%Alɓ9cVkRRh5)_QTܱ`eXG39sͤg=T?uP:0M'Օ>~Kg˃zh&`NqU^QTQ^Uq΃bM1T""C\ T}NtwUskmp:"@HrYVxU5ŚbN*V?^凂U#ՈpJb&B Ո¦LK`S?$scⷂRa,SΟ2ezK /lJz?CAG\1S+ʗxٖ.fڳUiSg,1݊~cJFP}|0φM1 =83f.\2v5 f2ŀ[ Z4aYM6hqͺELU5J[Zso5Ӆ?ҫP ͒rډnkR:(!-]nJ%F/xWT+ 8N붆j9e5nU!0W:7w%""r` Hx-{k!@rƲ콊RwH}j5PR5|D[:?;QS(Ԃu9Cʩ\WqAbX_!j7`mXuKhi=I N?ʹr$`cݿmP-߱B/uiD \o=0"i)+6{?}T}҈  ޙ!NXBv-$gti>4 I0p߱˲c'&U|Ux{d~KTXWQJ$5;Bxw]a TeŚVPeGY5 :f^zO꺞_MVoq:Fޫ^2!EPO)̕Z#ԛPuue$[Kl C K}J\LӞdW 'b/F4j/5|B*rE<1@NVP $=)@ik1z\L d@C}Lj U`IK՟t:tu{ubpcbN|Ian-|q/z%&&UסUꧡl|JEòpbX^Ok綿td'SN] /O/{N_ݑaPmXPȮ ~S`}sm8S -@Q[6ɇht#PB!wWzh T̼vNC J,7{o5YS&(WQA*<>$)#!OcX nJݼG u U(MfC  OMϗ\}5Z  -\;nYBUۀTP9˅ޛJW@#.tVUBߒ4Ś T37`xap֮%&9p%ژ})%qvoȼgp@MU}zzR9TXpl~7@ U z㞃vҀʍK6!/`/QOhfGG΀IOTp 5aq|>bM `yW! UR7@%dzb3b #Tm|Ok8T9(Δ H&7-QIpe$Yn"OkgPR1Gi8p|Wo)Pvc ϻߥjEե[%ΫKQMB 3bM tT;I#BK$ʿ2A9PϯLR#03\#7EnΩ`T,]vTn':k+E[jD"8hgT3N-5"g)um;TMޛIaΞfeenvvAwn)G̨?FN(Ȥ,.Zz7b:b&U:8}O5dJn6:䁀#BU\AUXԉb ͕&tॳD jK jdοSniNCȣ- Jy< u[kPϠpz1TsKnW,LKpچ1r:P_~^AV>F&UgX1@8k|ܜSo>.x%:d2C΁/:2g0boQ6}D] d@,7thi_ 5Ȟ]kNaKMU(\8}}n3Ti9 `)u&ί k%=ۆC̽{UPŧ?CQףtV|+!veRUEy˪("8^3X,X:MAu (ӂ,Pj֔FhV,#CU.ۿE-_ލi ΃sUrh({,?ǽL9MXֶ`9,EMPdBf<^Jp-֬JcTK`+frB9tU6t ӮTfKSj%R,k"C!ZS:s\7q]bk.`ܬyTPwByLmY Ub:EԨ@B 0d@[R'sV_?9rLo*(%2Gՙ3P%ZK^ P]d*ޟv*XCEAEAղ콿|{bRƗsV&?ПQԁfbX qAFX,b!LcX,:>΢@bX UcN-iLN ,?10AH P\E^&MtW울@T6}@@@@@@@@@@@@@@@d׎Q nQ(X؉بB;!7(^;iTS| gUh@[DD" QQ**ET@T- mUUhOTW1vUBJ&..#]Du)n#CDujMD/2hQMX2PiWBDu,"U7X x)a:Du,^U{ 8g%|'۾0QW%<>ivs ݔ] P7m.Ǧ.Q]Ttb puQ=eNu6?]:֫AY{`Q@```dabDd/IENDB`fontawesome/man/figures/logo.svg0000644000176200001440000030276114605637270016524 0ustar liggesusers fontawesome_hex_logo fontawesome/man/figures/fontawesome_shiny_app.png0000644000176200001440000023363314605637270022153 0ustar liggesusersPNG  IHDRT4XBՍPLTE333ܛǡ///b41d&X_$w/1<43>>>ۣHfff347՟I23MMLGGGIIIh01:::32F򦦧Y12F[[[嬬41[33=34m]_` a2:AE=4xyyғQ26Q*\NB45{CBCSwٝ\cb`†5AGذonn˺ȆL48m/G~6O(NrLCFM▿۾"Yn?NZ`i]>0;`zrĈшS{n,EZy\k%x̶Ъʃ6¬ex0jCjF/᷈?ݞkDΡsxg_n<6zU-iᕠHXdFGq޾a%Z]|Koy!rUGn:xGIrNDbŁvk k`dLDj\KERjwcfv:oKv^GTnbm*wρ-H2}ȊAGQh-(& tRNSuJg4@IDATx;n@apF<19E 49@,%٦q}׌v Fa ˻i-hջ:_d(V cgMyhgZyqV-#' (l|j*0c)l"< t7zM@g>wfI~_<,ݝD-U " / " / " / ";v@`_ ;"td ,H{`,Ľ*DfsN{o%U@\DD" QQ**ET@T . qUU@\DD" QxɳTlmK~Nn+5ܕ8-.1ڮ*NRe8v+pJ|Q-fwIuV" G~*ZZ&+Q(YQ y3°XwEZؐq܅pN jWBTqTkRuQ :U¨.G?Zi>Sb1ȯj5e+fgݭ1`=c. VaT?ػc7(00}PY[U$Da $¢ @.M*-xflp6bcB΀p,كQ]#hv_T3^9lJ!OJ<'pGQu^E )Qg*ۼCU*!*k4[|-!v{bxܨeD^w^Be2c B7:V jTݕ};xB=QT-vBo7P ޏ޼N^]% fH 돃Y;MQ1/Mh5Y>!ygbBΞ'dfp+5fEML q/}tfD5|$动 7<̭c_ӿ+o }.=H8Y%&ؖd75џ<ȑr_\8B~{zpR|MS1s\X(TѸrKyFwGPӢ[@Rqd~#I"rrSYψ*jFA-6RI[oGjk<~BU}KF!=lTs6zڂ,4NeQA/s1޻{fF CdV5RJ)rgnAD5^Uka)Q}Co*ٕ_bxoB(~ʓ5ܩIO E2e.>`iw)5tGT ܈ǂ&`}(77茖8w'攨V":_QRT=^u;oaB5j&jɁ),ؙ7)1Wu1^Uq/vlp܈*FQly8WF't^r.BH謁f(E5`\"5 */ }C:{~YŌ!{+ ŝ:ɆF?ǁj _!g*Fb![(r_A;ި6G1g(:>Cj-Q-UlY'dEWU !DxfgCaȈQtʪwywE煝 TN0䨺u7GgɍBt"3F!=WT1a2sTDjfTXUՠU=/"}R|NlM*BHqzP]fix;Rz7k_jq;ih,fGY; ʨrYZ : -O!2kPV:_T.7RGq`RѰhJTEnfE/W๐4=Bu\~H[V HDY,Q]ZTSأ ӣj Q͏s*!OUU;U>a(?T{XɈEi !td G#beޚCQUˎUQ<00QUU@MUCS{.G<uYٴY+ewLMUuJ5q4̏z҆[͓DudD4E̯{.Y9ǕqaMFu'pm4mZ(KeOa]fWkT?N--‰ԾSuʅ/Gㄮm i$9w}Тz瘞u}[v䠷ֵ.r]XhyQ)r{xz$`:=ZY\oq1T>J39Hf\/̛ϪWJl+ ,rNJ'Ϩڋ3Y>93!vP>sMT\CޫsoaO#:VR[UvTjV*QEdQmV?bب!y:Da}\[PT * E+5b {+aڱW콠E|>\kgΜə-!d7ηsȯi*Hݸk?E'^=E2 oT夶].lDɹoWuʶmѿݚ{g*c%RȐU1O׻m wZ S;2o5c`t5~Kf'}]ӏ F5H!y:U?FOU_r$7QUqn4ƻHj"iT2]!;bp6eY/^Do\ԷրFqMQn+{^yBf CbS{3 ?;o$M܌E8EY؏7d;b]R5N[7%Pp;v}ڴw#/T'x]5€_` Z^b;|,o{[Ōt12#~񷏜2Z"`c-3BoxۿxB:=2V8A1FݫDbe!8БUxfivqiRFy_#lK%31Gm`/8n-Ѣű'sར-]6.계jfG, BJXV~QrWYBﶔ//C4k8,$A uY`SbGԳ,XϨey7T#2fVPr%+7n~RsUj*=tz D怪q|.ޮ#E*0ެJyTt<"_/fzL \> ZSɾy]WЄUP۞ӕ 1UY̆P}?gf *7$\8[ YdWzBwHE+_4+. 1nR۹RGJ.ojXZ}@ ItRG슮w-y=Jj$Yr'âOPhSXB)J0YP{M-}+z)P-HP!7Csɏp+/)օ8B i+ȌTXHNp}_ԑ(5T 􅪢T*Y;\CU|&vT=T8 9;Ѵ0g=2ԟJ< UHV*nvsњ% iF~՜xR_*JIjovI)o`캺J=v S'rXYC$x ՘ @0Ebu|-T V=An9Өϵɪ.L>WX"`7Tv*eOjmPjiSjs͉$ÌTkxP0 Y:V {PT_@HCL+`4(w5TrCu^?w1Xe!I"6TA0N~T* G"gj3YrmHPESUc>׸a%&dHŐu2u菎 9=k*dFr]YBRz#O闐jv؀< KZx,2eܵz sTi IseڵcBeOEF P-ge*kgQMKwڭ|efFyqRĞmAQ0@FUkr-=Rvi-rXA6)D}ET]@:BƦڴ`O"IBs,nAPˎm'nE_ 鯡J*ׅ8Z9T!,cXնNu2`.2;*KIAdZv(Z4"^a 'x=5"=jPoO$& T 7T)sYw.⠖ NAU{%\:hw- L$(7Puy Ulp2AD.Eݳ fG%I@5`s|\&#T!+ͺgN0PՋ&Lf4Ѡݭ P/v aetijEiOj4?tPCUsYꏿ#h 鱍X:H."Y/UC 7=hE;ca{#] Ut"8<۽ CloHX!\P3ސ2¶kpH?Oq`<5beҗGVg{#=s KoҿRh2- e"z?PCG Y EdZ }0!I2tFDuۺX=*-ӦyVi_4sgdv-\fewhsoBv:,H:4<ܖ[_Tis5 8 0NzMAQ8~+Ucp  % Q**" @, **" @, **" @, /{ubEa4m  ZKf fb6if``B\{2&ԥ `T`,F*ŨQU000r(paRO]ֺjTR2%uԅkQ(yE.E ]]ۏ˜撗ۗQtumԅ$gp=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"ʀ=:"QGck7o?/pgkbz˔Z؉&_\wWl gշOdz')=Ub'~sMEq{6\"FDAQ.h%`b)t("\B^@"8Ա888sOoTr~<0M7M}Mmyuǿ̜/WQ"!w(⑂`9#;au_/rUQ QͶ<'ȨnToCWPYc(iQ Q[kjFuyF5T6ͨECQݱpT Uk.A)<%4!O6*]\?񄣺imxrQϹ}M}ֲU[Шk8W\儣 νFzQϵ}>j4kxKۿkJk*ޥ GUb;/׊ڕNkaTw]R?SU/V-`T*'~!I/A+0Ϩz}^9e_ˌKJ/~,FU>b:sj 誟iQKZJvoAdT=`Kտa1Y<Ϩz W9[AkU\ ?_cT}w]roM>0>Pԫt>@SzaT̾Uݿ=Fu Ou Aٸ˨@Rҁ[Cs^\"yo3^]/8 C`T x3ʨ}e30bTĒQiRҮ_U?ı _#߮Y(. 'j~K 85K``vʨZTh4LYڗa8fT\TzmLjxEuEw KRb-*d;@Q sQ5^)#`ƨVT[} ̨Ҿz 0_UNZ[Q (;ʶͽ5 ե~@崩dTa+/gƞB94'`" }; #aF׈NJ7#RBO?RlEҙ[zai__E ¨x葁"AUr=2p_$JGaTA<} *9/Q%#E0 zdHFC  ¨x葁"AUr=2p_$JGaTg'@F^Zuvo ^ ? ľ؈ľ؈ľ؈ľȢf]їDQܬ bG%Q=A,7¾X׊.g]Z: $ bD//¾X׊gvua_akUT|( bSTQDDrUUET@T QQ\DDrUUET@T QQ\DDrUX`4vD Ux*H^ RTE Ux*H^ RTE4p|Oc'CcG*gp0p -AB]T? (=;+/ŗ%5)"4W'|?(B/DU{T5qLr xTPd,}l@+| jeTOXo{U\:f̩*0nTjg[Zs vTC8ҹ'-Q~s2TO{NU:BE6wuBt.[]Ec5b:U5X:j1 Q]xTj}]'&U 6ϢzG)ofARɰUTk1txTԋߧуֆU)5 WTwl/2ƙo~8eٙ -j v!JcVJ)V[<7vz%ɓGy:~Eq-;Ixd={ZlbI/D*"˭uTL{VFuTͬojjTZjTwQanݻҴVZj۳О=b>((>( PE 1(!@_ c`LOvgoڽ+ׂY؛ݝ7B*A*PR=9?߈TkVԹ-8pvBH5 S^T=UUU4JĿOV#V$U۞A殃CK֥dԴjfRB"ט#8l+{(5iZ/ƘM|ijf]ZanўLߔ6[ ZSw27LsRS70I@F14ڏ>n%lbEER*T{秘R}x ۪#G7eEB]ؑ8dDyx 廡2vX W__~΀P:0lyoPko+;z1K7{PAhm|]bI5>L+YL Б`\bEeL+Q TUbYxDW1*AyHU=V Cלoӹl%fiFLTsD|')A1/WIHE/Xɐ_-cBF381И* cj)vQ ;3"\2QKڞp<ז2j7V` PB\b,kO{7'I1hjO>l#HзmKxyQt1yE,7^ȫM7IwNNJTCJb(T=*r"<ԳSaϴ8Z$Tt'UFGi>֚RS!>޾;qK8jcQ0A(;G$+Z1æFdshPRAXMZji*՚6BRD*k\%T% @x'2~Zq+PcXƇdG-W*TbJԃ)R~axQGM.ţZR.|Q'2쇃5ξk|F1XN!xYJ-9 rZ79d|~ ~BPxPVRgNJ]g/XJRuXReވhu>Y\"bd0~U<5`JjQ? ZDm"kP~Ca?`8QOX 1q)#Z:iFM|N{Nhw"fL4{F6otԒg9^0n"F!ZMWrxBN [1U@\b=etLŵzRV)cS3RESJˣIuCCx͑{^AxTk29*Sђw?o›y^sS˲,I5 $լOJxi} ~wHuBgY>ѯxLxT%TJ}#pj*$*!^_%jrM +UQ, F1"xN EQw2^ѴfO}tֵ½7:fzsđj#:ЌPTӀkug5[?R]8&ET|Q.ɞ E79wvikfA;K x6Áa2ɔkfXR3Y0Tڍnw:jsTHR@eNa1ZQ L5mP.VmznǓ)vy$ ,TgĔ&or6K@J8A P\ lhx՜XTZ7G~SDy;rDUCJjG/7W<9Ԕy-"Qx&vBd,Q,peٿbT˵ʋٺTS^(),e-SXXs[<ŧXYjF1RފWߛAk ˑ?}ZXXddJcㄼ-wHuڧ EoTFBI@յKQ&吜6C(1Xج`VPTO$͓/=Y8*ǹ^U2#f^R.jV'2R#ԌE H1T &L*ć|Iy@^0c N~x)/*>?g^1go<($TŻ77^ǃZHUS)դTՆeCwV bHqTnr'O+|y:PVqupI5 ZazğvWCÌ "A FA}K0;NgȜ@k*ndabJ$đ vH5 jT{jCU+LTuj "qq$`F*X#`8K;T voA$" * k*0)ftkv^#*FAT# o3A{X5j̩ QW5N 3(P% o2X5$.FATT*oUT j_T[ WiKARǰ).9.R*AI@ADH I @XMDlIKG:%ܔT' LRhj JIy=*9u*HTTCJ U"U*d*HH Y R,R@T T@E U"U*d*HH^ 9/#i- - - - <,oU{f@E~7dbʪ,(6(B Ka6oG(مٙ;Þr͹9_qgo;EKQEҔyl䴨R 2, sh!(U=et E_qgo;EKEғ﹎@N*%1 Β0w.bIRQygjb[tԋhb7𹣜  ޷8Ј 6 ss dپKczHNܷD fkj<{j:Ҟf#Oκy| (>@h!GBvE>~يlB:rE5E7MkU$\#ʣϢρ.V0:Ѩm"KڂQsD*)l:֊@#sNG' 4 `5ZghJpS:riv>V$;#+@F6oDuD!B`es]m/ֳsG-+=(Sz9c`V#Zˀlt\3UU*(fv)^8PV"Tp2s̥BMFm|ԕHGlK|st~BNc~ NW@va="l{t ~Uw P z9Jj$R%/[E)I8@~>MRd0|tA~.z,453G.-{` DxuRӫh p U4NC2UwJD[:|M/DP|ʠPl@=fC`Mиc(A*"QU3%@[A6{KQ8ATYW ;\RjUޖۈTUo) QW" mrֺ}3Fr>I7 >4xYO}"a5Q߂U/1jj;oʓcۛHbM!NOJAj\e:8|DMmUȥUu ިT GC<.@ze%#nMt8^(a5۪X(ܵ: /8VCPdFۥʂYI)F~u+ԣ %sF$DaQ͕;:k5š~b<^|  YT{[o#B! NE⣮D:EO;%/܁AqpNn0a~q9T}Jueo6DlqT"Zp|I ;{S ͹zOTw9 H+CTm#Vg\8HT/y?|@Rb+&c ؞#uD-xY,6^bՐZ ޛEmPTSYH+ fŇFjt0P׋VG] G^*Jhe5޽nJ9*zֱU;uUT),]=1/h؊;R78~!VHQ-(7HKK Һ95cßpuKRdž (^.Q;צ A#W.;#K>yާy 4*AX euIZǻ['7KgfE)>8ËK+^L3( ꈨ[FC O̹]7%zkXļSXTo}fQejp/I=Eĩžfi&*OȥBJw( fnã"ʒ:" X:zDc޻b'{YyIZTC _?)ӎP;:{Сگ,s \GTMQY<\yr%\uGNfRTf¸r('ٮnɥ-7T tg ,4ICS d{'JT;4|*UӴC&'RKE.AJoBɺ/f0+JT+DUu|qHCEpT0nS`($_jRseI@h0^và-òhNDȥ?~mXخborE0hWPy&PZV2ʒ:"vD3Ci3WNzAj?G~zkD;h)7&/n$e"ī}<t׭-?aISٰF =3w U-7Y*zK*J#ZT3Eu]c0\̅[T+O捁XT T,QJ蕱x>딚eDS\p٤en`>ZEw x"ƚqWB4 $BeIuhwfA% 7nQ5EƢJz{}퇯Q̆Ǚ 8Lʛ|n\NKdsvÜx~=!|-XJ oIdXa'-|FP7.^_# }?μE\9aЫg];X+OHHKCw2g\p!ZFyٰoT#վ!;mO߀1&3#U*Z`\S]4(^V kCzA*_͡E77mlTWux*T_dZt}a:A9A[";ڛtdt@\"Eo!TQCY&ۨ4՝3*sFTyI ΂ %hZw8sؒf ژw!pFKS:hb]B޼=HTt/-YR,)SA ա,'(KꈨEz-21߈ʈ*MbIr΄EP_ K3'^̓gZ)=a#'VRT|j+hH`*).x[oNR!4Vy6aKdgТ˼paD'N*Y0.yJe|=ꤾR.f[m.yc#^@Ӫ38w2ri{;Qڭ043G'r%З<@CW*ddQQ!NAB,1 F8l]CKSjjwb0A]tD?p(i!Dux>qQ*mi_wWPp)I2\0@&G Op&w"?gOTߦ U=(hk~T%.e620JTR+GQ.0hP偎Uh8NYy,a 9FT+C@Uܗ @/,TMaBFTE@O͕ڥG<9oLrU-7E޽t)ow/! oy`X7)~UwD<􏏿鬰:4!E۫O_p&%@k>QG#B@4 u1#ȸ0T9rx6@A n2ʒ:"Dzo`X';$D5)u`VF\8\Qp/-NTښKL#sy ] K.bxG"ClՏw8((v3־ƾ73v9|̋-u:^]iTU d~G6i|{QNorzfQZ.-.Iw}ٙpAU]նq v8'YmɁqkk~o1.An'64`oF8-}-Յiq9 PvNfPXE]LЬ)+ܠ9GAzZO:4t|cd9]BowQ:qrZctKs]">ODا ѱTeKȋ-urƿcfi࠶8\J&FM#pZ=n˙-w:٣PR@S9Ai< bX6oQm'~5?ҕe/a.] 29-Yy!%D:Lj,%ꐚ9D.Cɋѫc. ,}.6/ڡ* 0Sꐚ9DY?crsu>rLsQ`W3`EL`u/|;(Y:\lE]3EU }8s\`1J̘'Q&VRnT,}7ΥP\dHJ4,Vd5vΗ^z'61E5#####/{uHAEyqJ!UH RTE UhW&PEG 6"%@QQ, YDD**dUU" գlT+yKo#[ZFc a wѡDAS= " " " " " " ":o=%H^ RTE Ux*k-QDaC%²vchCihTB-mt*.heWFDQTVXEBHQsa釠î{f3s3CUz>]kPm~\JHxvϡ$<́/H =G@hgSB6{v=ISytYE!lh+JEf Sdj,O$;ɩ9FQdMV9\Dń,ʇ4jy&]ו~8yW%,!P)1tkkj& qRxەBT?RkQ`y{dђPU6*PH U!*bB5bj J[ pts"g;{?.!Y:udMWWhtBG; ʮv7. R bxmnڔ͏<Zhb}*:'*3T*P53gK){KV/0P ln8RG70&3,MWBu09"nCar @7R>Kh- ff7"dbc*p&TH g]zZq[.#ɻb,eFzZz-8.xA(~8Wx$eM렇 < 'g渵@&M>K=4K4fh-"`e.fJBw.*Q&=j? w0cGRt|i|qya䡠TT B%ZBJ3YsQ,KBWԲI9L^|v{Y~|El;_2)xC"?M4{3ތ~OWT4dNFDC[T-T+iXu۶m,uȊ"\&’&RwQr\PITo|M8gD\rM>W&eR/j>g/UƢi wJ[XQiqʀevJɃn}в_RDKR7iVXe"S,T4ÝU^WgH1 l+yY2By_ۼUnK|>"oBWJU~E&?x-iʷwVScƧCPT" 6Z.q{ݩ3%jbLC+1[zuf Do~.#KL * 3eQx̃,F'tQ}*لG4ժ)8Tho_バ3CVMT&bEui8ބU\a?0O|lf9"X:63#oNh65p754a$~2y*d>[ Bc10.*qnљvЛct2=yK#<4uFO?/.?=!z+y,9E:۫O]=(j{ d')JgD.vxU1B/{^+%# Kâg wM#Qn hmw20ӊlgi+"Kwro$@ϼV'Zlgu e> x d侨f(.BܼBD5SI9M%uQ+#C}<4sfgqaX:WlTf(3A‹jz,5tk[b)Q R)IQE @Sܲf'8 V+V}Yy]35 =1o< .Ww 942BČF #qq,\&s՘ٜE\)^ax|TN4h,:E ]6|-jyh:\6T?Kbj"qˏ|#E#M2ERTn_Qn [,Kv;1`];퇣wlbc=6s t{ UO74kxkÇK?viXq{)h pd}wJJJyEdbL1|xLwŇo=t^l;o&)QJwQJʢq)|xZس墉jlIQu&y@ V6cŚ3YڔVgRzȞ҇[yh=Ϙ0 ezh\COJnJ6iC ?.zr_EYK2oW`~D-uVk&2ҠC\>1ӢMT~4)i2Ece3^7UhdO2f*O#OFʺ禨f&ڿ&5X?[.[oQlBpQ+Pv2] 5h3nAJq2 |[1 =n{̈Vmh6::jc7ѫ;i#YıF3Ig Z%H]omTQv/L g3DZdh!Yo<G[FT%59_wĿE mUCdQmq{oܵ"Y.":d~a1Rc<-\"͡E=,FyaJ|6#L V6gJ矏O 8‘JzŃ-r\&G-RԜsJTyP4x x ={bG4T0v>Jw݃Dل,m@Gk,dQ<|\}{p1^4iPji,؁9@G:k;}63xhІZ*LGO͠S]CT&pblJ|!DUD%}LiYW"Er\j/|zRuanK~ٸk-Ծmaii玱/kqZɇ# cp~꠵vk[^pǡ 5逨iJ&{$HQD^:b6X'lPEcJp'2 US}ylce3XH%Kֈ,QÁ6}Hu5j*w-ֈۗ*At=xs3 |NhQEiIH[x%]` w7k*S(DB>lD gfVQԍ>)s.3%Di.W 4i_Ɯg_+7R}(`> *TT#f=F6%]WdvplWXgpzz(* z?v}:Jڿ u}<8r޼7uؽA ;g溨J6 *,P,, aj[j),Rjg{ `lO$!P1՗νXYC41½h[Q6bV*gsJ!`ce3XxEPG1]#;Sl+<4߈|A>qfS|Duǘ'҆҆Bܝ@;^?X`jeC@cX!aU]h~ 4C`挠37ss8{U<|&zZ~es"eSfQ(: @:cfl ^ c v6cnG77Lz fs:|S:4C+rݾcA?p8zfVMZ({ "6DI$.ދ[`jVIʕВ;wl@P 6642000kl2 eN9*302լƉ+}z74.nS{m -|t4Q~Prޤ]M49IœOUUFT@T QQXDDbUUET@T Q;vl @pE״&_- - - - z螎{&&P% " " " " " " " " " wQQTa[q"֊tKd e F<)CBhj<2KE+ӔH˰zz|Ze|Tj}ޙe2e;}w 0`љNҟ*FSded$&,qkQ՜ZT9Si{&pd<@FUI 7r~vd~v8  <*cܖ`A:cw=FU2ܪt,Hn\NtSՕ?ۡbjn_+93k 0h lƜ:xI e9-w>zd!thm 6*59-S"gjE5 n#z C$nr y&*!~'/+?H#፿5Cx0U*ޛ7&Ys* \?EsC Es6,7 0Aԅ(æOQ]t%U' "zV[}}L,O%OF,? UUh\+I/&ȝf"7}~ŭN_Dt:AOY]UsZDQ}` z14-fs FfƇ'QO{D7ԚkxVtDAw-\4ms]`RQ,KqtHtuVu&% ,mhKl62MzlLl4.&y]7jF|~⾙{JEv;Z^Dӽaͷ<:A:(Z۾ԍ^i/CժjLT9'YxLrV*"~$ ]bӚmKޓɛF=ۖڽrO(MEk\#+} ze5h+4 lнqi\A]ŀ:'>@T[fsݾ8˅9yVNT)j[ZM/=Ew/49I|;rMD|dR_xY-Vi {K;j~:ESNxT?yGT Q9A&#u"޶f5f%|DAo3K5eb#xŜ^+Z`G578lV](͍|`ew藎XLy&LkG[@Md@ApH4l 6pltIxP-\.G M;c񾘪S'hZ<}uPU 5["uhWظpZ΃CH_e-GT Bxƭy^Exj!#6w|\v21QaUATq .HTu£RJR7z|M<5Dn+Nkl:<6M>l7`D䂂V6E6,( :JQJ/Za%ᢚߔi: ٲp6XD8xdV,hA\&.M%h6#`$D)giE2{-DN׼-sfuAgAM_iGځX6ie{FyCեo#:xE;~Nv $QE)FTUn[\ɫѹ (weITIB +l;~KLɺt/YP{!7 _uj'-A P; ьe*Q(&<\1ir{~y7LcCcIsOM4ýŊ: {.>p0ҏ*넾Oo#{Ulkб-}h~ߒފQсGW,]NsbP2WW:DUYZ\+NӋwlEOq|`nEUv >[f3L"o8!s " %%it03&h{Iv!܆Jc)1%k:U MYK>^b $մrGTu¢Rpvl }9$W3843 nz~$njH,-*fe%E7N͐t8I/_Q0U?[eSIG:AIf+ДuKlѴŠKG,z4=:֢>LԮR_.%o~DUY'S """*p<s66' JCѶR vjių=k..vlDDRTXgs EUYZU,+nPmzNש4|U1_ꀧ]EJ=cX&:{.?|̾IX^ji1'5';h݈pẓxr}88e7T}Qői ( 0/-i[fEOg~"Zhօ!?z!~ZQ哩:Nש*l H}4>O QM+nѿק9Y$pm[W9n&q"-OY/FTLoD7$| @}Qͺuv"1̘f!&^4p%}*Iv$ \١m&q_9j$6֩\gҖٌIdA+-3Y$&Lآi`WäG+kCU~s"VYQR'sƧ0 A QJQ[!f˙}; 6\LI)QTlEr5L/S-nJl^M:!G^N$4Wv J[f-,DqQݷM\û!`e[&NrtmEW]g,GX t,-~bjnDKFrC#RGt{ƏLG)rUDsGY(emb;Rid>`m yNU6AT_Bi.;A3&oUu*m H#>\NU-uPލͧYrH`b Yǽi.&Q~`k缛2&g:%hLϳ鳭ݱbUZ;.{~Z' yn]e<芈4eѿ0)Auk5[0=җ4fAfpo)Eu%:Dӷ 4{QŊL%J?Q\V*4P{u" 0-ǻevfN.O LlѴ(=(RDO`YD9;od_4#!uF\<-SDC@mlETm4 e1kBi)$-'Ջj9k*G40s j k-d1 Ֆl9#6 {Af&!ɦbmwLL8<\kGS7|/4Yw!ugl@?IhlŚz:KN*C@qt7EU?; UTkEݐ\ +brSR0͗:mlgMC& cULKs ~<@QHyDU0orNƘ"ue@u2 WfF M& 6z.mک;k1p"}Tdi #MfU l&^H,3:SDM3DՀax6yV 608`! PUznS\rjoM3DՀaC2}uCDoM3DՀa+ z[J#n foM3DՀ Kj j  Q5`?v@bk*ꋻ%@TET@TET@TET@TET@TET@TET@TET@TeFrTw`,QQQQQQQQQQQQQQ:o=%TE Ux*H^ RTcL\0!U7rC)HLݙZPK4RP[$RKʐZK'`{uK{y511111/P511111Pju! A|Lz-$Z˛~[_Ug+˭br/ZJf!HV~Y"\;&ۨEA?q_Q5&:.v/ttn9v`d\nNF:t3GRVy K+w+đn^J,QrSNS-FR~# W*~#Fܣ J Nꩠ6.ջjD>-p~t9z1w]bGkj[j) 5eO]O8u+!ؽQ;Ж{O 5b*%7th,Cpm>8$Z3QgZҁ6j/-UK`ŵgݓH7Pm71w=C5 8we`Eҷ}!^NݳWJmwvdߵl>+")T2b Wӏ,,ñӝ*ӲV$h}DXP€]2Aq8TۢuBʎ,-NbJ[ #2) ̍qb(H7ۚY<7{K{W]a8g[W_Nw?m`©Q5.S^ DdY4ӧRzS>0\9V9.c8&mI`f U%&W[+H4JzlJr|9{8%9 X"F{ٸsàp]N+IƌZbTnyDkeŠ|1O,t$}YkMD mj_N˧?֦rxUUfUkv}qcoySЌ&ѹ\Ij:/*=&L+H%/jY?o6>XN?$áZ73౱|ꊋOG|HQjTT+Q3{U{`hifMEl5Eb& Z2 X9RX|,Dd}Q&`@$(5Q´k,-+ν[n w۷s>wu6v'rcdF9++[VJ1r8!:򭇔"J^Ŗg) 0:2:=WB%G`!`d8M՛yJO; VU/pGegI}kh?q *Vk|>GCB4i<srr'&[Xh7>7T؅]0c˗&JlW!0&RpO5n#F!!VZO 1HʺVM?>J93z** ZQ.R)W<읗!e PާSi V.٭D t] T̖z *Yݴs2ρ%B|<V>PLbukk'ԭ8fBi\b4ܽ]RzMB!Bj=<۱K/n1rNB8;s2{_D1,=r )tUdAHpUʃۓ겒B׌)̂fAZ&j]!'n_ ݅JD[ILzGhW~O $t /s|N٤_hőU5J߂ *paմRWAnJD=x? W?8*_h%6gfda,ǖ/MyrG*Dу^LwoZ`r謣Sfl,V-9(V}.K[y2Q"Uq6"HpUʖJxC0dmKb@A4B7bه wo f2R!ށ:<.ZP=ȔF(&H0l>RB+\1 09CvTLxZjq}km9O$[]pY&3yA"l@}\Cnݲ6V$0]~K}]8]\r.0Tg|Fc$e#1!(dn&~tH*|*ʚ@Zi""3~ Q@Rz?yMؓ*]JrýE#XL_raZ<Ƕ ji ӂ(^F-0i^e0?cKFnz<+&Ft݃s-0T}g&b˜B4Cf/HIj&IU^$UL`д`{a'Ɛ=8ZvEk?'DǴu$GGDDL+1&;~jwMe0->luaɔKDjuliRb*1mOE<u-_ŹXsƤ\R#`.i낯&2[>.TirهT#lT)[.*GMIP fHR;TSGkpt9!fO4ӋNP01q E&TނTU3a&AZɠtcJOm_RLjry@R@`4Vb7Ũy(c˗,msL؎o{zy@3l߾ֻ )TERRC6AUaCl ^7 xz@1I\(*%2{a3NbGLRoTFzM[YΤGFt0c媭G`)om @oT#M&Uk>[IMؤ sQ-e_o&9:ж)d4nT/c8*|=77 {ñKS>j_1CnYَ_iTM#jAJPX][ĵ3N7w8Ű6:&%0d:\b_e,e`߬)XR#{;n3FsI~xO6^N?p+bh*5ඓaal0& տy󅀊dQP*Nsc@C EG! T mkjVY?p2!IĐPnlȳ$o0 LNbɕy橾vJ۝i v!,R]aH5G||eǍE$ސiCD@ťWQ=;1&*Z4nICk+ MĈ74<Ýc1/@qbrKE`x^߮Cʔ QfV?~ORR"ƩGL'2rb\f_+&We1>JxY\՗q.cc\J2mLjzJ%[QAo?nz/a!*T 0[C&BF'ՙ@/EQSف9° 09ԙ,#<ԈUȖі:e>E OK7YZ^ }V/w2ML(G@"X y JήzQV~ ~؁%\g?OYĩ|>_4uft( YF'埐*S GD17ʄ 2d=N ҥfd٨3ixSͣ)Ew;/,|D l?._Eŝ5;=?٭kj:;ZT27IUX'N#be(@jHB> Zutqr9v@p7DStG/ Tzg;CdANDγ2,biTċsQ"<[8G Ի p$e~y¿@*5HUsA )k4ReVT$TPd3;r*tzj]$Ov$0a9}lm_+br | .իrթ;kjT=r26REqNf>j pṋV1vӦY+`~|41g8>'T41#I.ew8Þ<,_ƵBE"FqW ٻq^|8џT[s*ׇ?$UFDoPu<#nd0b4]>xM=4&D}L9~V`+ \9s6uEżDf#f˘(\i7lB7u|iݿ:1W,zRZ3穮G4V=v'% 0`0[94: {I Y~R-Y5ү/ĶfJ(OMC.GZ=hdw.chpG5^9(2=KI>Za-*ڕs7-<"^~QON~p[TQm79c7m烯JaфgJziͶlC)$UӠJ8Kj-4}W@^/y ïhz.:E2TY|H*P?>[Z"ǖM3*JH\yzDwscT}:[ZI0 jo̳X{*)5: {Z߹$E(qbE.|kvDIE%S\gq/=5&"pJ͢0p^O@?摙`sRYJRF*4Ԡ@V'92+}&!r>HvÿSjxR2zl3 Us0WxޑǼ:G>H4iZ.srfVԥa8-0L2џlrJ\'KKmNb!,}X3snVF}MTs!JOZuFB:4˛r>%\fwNwW7w0鴒*6{1}J BѼz\sys*^Z|w wj׮IbTEs@57W-`ׂ6+OeM4h۫y>UQ3n_R=>jA<cJr*r7 _^}}X4S>%LY-UN _ES|pr@ {ZrzQ^eE ΧԄBCNB2(a1g=!oXT%6VIQ}ċ&fRGtSAQ[n{ojCۚT1Uc*d O~yy,MYGnH1YI -}GD. Ka|p;|jf*%(FR- e UJ9>̑5#UK [!YE!z*jY R5wj+;:o(zQȶwaZPSZULǨYͅ Kpa,# BcO1Z_ニN4%OqI~3Z "M(8.VlU w_* d 7+"zS̴~Et^UP􇙖MUU8@e8XuNJ#wdh7||t $vN1k-\k;TOؒOlRծCu\FLA-d-=r-ʱtGՊhR1qÌ7/a]U1YO>pVLx'KU؉Q`~̇Ih>g{7tЇ"vN1K-CxK P1rgPUJ\B8 ՘f"=wʭտ]STeٔfg6$0DTC:Vh5,[D B,Ls"IDB$, ))?s{umc]^.{yan&}q+bQw}ad}'[H'y;~5M/8ѩ1JWĤzڅˤ,?ͮ)~tIc#ij:bL{9ә& Y3}ڴtBhi-LӺ!aa&XJy].RPfK9[A)v"Jy|SJkT\6 iDJ+355XN/nfRՃ u)Le҃/Yc}+|V\0sZ"oT/(gt.ੋIs_oI5e+Uy yV9~EzҐc@|K=;y:jbBFB9AJe T~’wjeݫT R:`=>@큲VڥU!rdYd+)%PIHt+)XsJzSdiq3@7=2ynw0FFJ%pv,X3Ww3236Ԗ9 ]f6Kt#EF=q m%I2sV[{de7hҔ`0 7j|LoUv!Uu  J\3Ϝ24@]>Ȑjľ$bn"N炴3<&!4=ER!ʁLz/ @r51\V{<:nd$Ęa_5d6f1! h "j1Ң;{Gױ*;(  63/<>)sUn@Tw4"id$Ę!_T>,1A7XG@zK7O0M5nS \B? B*Q_.Y[jHu;vԄVŤ= 9z%I饸+U.&Zp>*a(,:Lz&efI]VT>!=e-.%>kҖo:ʦYM%ܟ )]P=T#OɥpD45Ic#i $߫AS3NkzY,{z$t #oѥ TH^w"yI:xoGYK^Žf@Y{M)6?Oy `:2Pt(C$16"U(|3:˶Ӵ0k^}EjVrDΉ!{P$#P^r1@f!%.eG2rUsaM +H;|)jy#iƌ¤E:^Kzq6];ϸ|Kuk?A׷"w E\ƩUPh[s0e}4Ҕ&l6򓥽HQc}HUsY؎T哘z \*UKqk[4DGt[[Rʃ=u[J~iY6d]=L ~'vPHZ1di$@Cت2yir+g ׻3 kZA e.C!')T'(RPz&~J?Bw"W\ۇTu1k;RN̙;Uv|)j&e]>7EJSE(ǤW.^!kU5cgܯRAg"UCI+0fʹkDk k|JrH\P/B]?vQjTx=>t{ZqߐeR6&~(lw:-L"n ֵ-5+0+qxt\0ҢT\BZ$QDYW+@Z<HNOc [jw#i ƌB+~H27&8hbA ГjעUY6^nONOPBͷH5qLf=U[/|BurK YV^# ll`EOС"nUmǾ%MJGuFqRTnt$˜ޗT繮KT#CxJqFoR: y9"RdAx(,P^ې.&A]l`tn\Ho6 JzlMs.J>C-^iӧϐ|{"mR&e׼\ݡ-R5⻱ c}-w.fQ.KU>o5*t&"}WM).sXȐ;/)kĝв,B%#TŤ!Gj+T"mL6ڡi'pD駣a6#H,̃Ar Pdb3*-ԄJӫKU;晭HHZ1d!S]U]@@3LayW XTPվJeiBkVgTk=';bkX?1^1N߿>-5I tvu狔=$S+cl)rHhϔ"verg4Yj3 I(_ht-5RSTE+L=~^j`$a_Tr̢-jKMF6[j5Gy*${Sufh2Y}f}X yه7T}Nt[0;=mS<8-o<ׅ M,z+[8 cw!Hre.א҃98HTj&vyLB!F!/D9h5/*=10Wac+R50Va̐/LpPMVX[ELo>ځߔTsgboY$W-cϧu ¤;szCˌp{b}>&#jeyJ&N)PM,nn6acA(GSπ:<'ɝ|BwiH=Jx[yQ9҃|HHZ1þdK.-Y|l;oX/wm1nU)s9[=c Ynւ}ҤmE:{a3_PQtaې.&qZl,~Q9B֦st|MT-5RR`CE}CR$7E?*xlҤ7{0p$Ipn,\,NMDE]qGADIPE7Џ=[[$D4ıs=SJ(2t.ez.ۈ?M q6TUoT}C|O+%;:V2?)5TS X.,NRDGa|=W[}mqOr, ,OF2*L!n>x|Q r~C J+ojWwhL/?툹}BǓI%X !H\ZiZx/zu]w J|r/Rn7xXo)8e&,R[{#m&>z~MӠtˣ~ vؖV[)o'ES 2-r" ^s\ T)?bdUbsu'&C#v3,z?TS L h5bYg TafٜzeQY:1<T-ͯYQɧa/Ѐb>߭g W$*H /RT@"U: x_6T4\a/a@T@"U*H -R@TTT7`v-:)UTIP%U*H -R@T@"U*H -R@T@"Uٻ(( Bi 6܎n-&H%x̅ A*`(XrJ8)'J‚Yf/{=:ݽ7Lk0.qƙÀ Q5`B 0`0`CT 0`y\ 4MN)paJEhjYފi[1o;Zlpz*jS!9^pn&7)iրj},Y5ZTڊ2221sC57l?[w흑_32^7yQ%.4fv4-"j4hF]3:F 77ɾ4Zn^nۃdDmƌY 9VM6hQ+w}E/H$B9)dNH"3gq@Ѱѡt ٩ ̎M,VZD\ z ${D\p^y-_kcƪʠjgBH;w)! q6KjA(PUXMnf8YA1@37׸DU5cUP?,Qm `Q#s?|_Q]i'#Mt@ ~ƴB: zf^`: y\#-~P&@p<SZ Q^usp!$ M~l[q9Fȓ0\6צXh*(/ b.fgzyDĴ龓""Z{~DvBĞj yRN{6٘Ю(kՄ|[I{vr,yaǎ7\)DWprh:L ~ =0}ܔjj1M淈IϚzVW=' >iT~R"8OxFB+֧eb(YGR~~~Qu}6HuۄYc39ܡQu>.T٨~*IaA 4移QUqxU8G?҄mL;v1 tT4ѣVaHmvAڒA6v$`ϡ'ڤ^GTÊ+YLuaV&-l<'ŏshW@튊lٿǀ`W Ug-}L--%EiZ&8i"a*hob+-i-j-z3) QW TiB\eC@HMZOTSSMuMr/"J~d\T@9t΅.H5sRާ`춆]MTww]Hzwb0#;R91a5jp$-pU|TJ,/m'⥭Q+2}[4'^eY,Uvyn~?ŝ 8 vhGo80)ם gUX`#p_S>wM;$}#^DϲHd4)B sZU~|~•GyQ?еV2E(Uzg W3T-b0~[i+9|͍[U-Pï@+�Ʃ೦>UVManL Ns1CEOb+R~Vv\WmW|<+Ѣ-bG4.Ϟ51*\ Oit}~haC?ʼnqX %o4Q1>O ꘈ%,`~֌åfN 9LPT!jR"fX)Fo;ƴOBdbsbK*(xiwKA T*ZVL58U|Tʊx5Nj#I{%CXI=𮖪!PǙulsFVwvK2 |2SAx1@oB]VPjy IƵvo#QQk BĴU1pLVl@O^_q;o]!rq }.lڜce (G9E%tKպ͊GTBvvo'-{2f71=o2ꥈvƞD굓¿=$>435gf}j46-`Ž%(:$Т=Ub"Fޕ*=-8 QuLi*;˦e_wrj췳ʛv v$\P]=51)&NLy )=LAleRm#n,B3I (@_CRT916IJIRwlF{ϰPvV':g .q5g/%$FXCٯUK'fyPxh*ǍliۃL٧ˮEB QUgm|L=[-U /WTNfVhj|[ٴ%LBMYTFoRBUfHҏ nT ʩ`&aŻ.4D*8ppu MEr*ob+S;cRV\TQヒaf_H|.6ZN NRonDuMroŪI9n&n d}ՕisӎEbeh&18 VU^㧨fRTS!I/Wfߢ?v_A,ņzVYi c,= 8m,MĄ'D%wʽzdz*(t )Lq9v?Kʁ-OLi}p)16;/ ow!;͗wM?Ex2=cD&UaZ?a؎0́ef%$+r)Ej¡w{Kj-Ҏ]&jROzV!{̌ p)ӪY۽M㿐!47+aB9ٿ2Q(-d9TBTwn-(JmCqD^fl0&zMPEn:Z9I_l"SLlC u9I/" cˆ+`WC;^VhGqSTl#`{Qt@LT0[TKfF^70DU51~%HG4OXְ9zZ(jElEpc’  /|o WÏ:c< 'Mœ.u-iPQk݉j!oc4+2CiXҧؐY!<0֞[R>&lG|OQUmF,+Ӿ:n&ƷV#jG)NqZjVYtKJ&%&t%l2B(_:0ma ePR NA+hqf Ų+c }UM~>Dp11wI"FN#%5XD.>32Ռ#W=kvqmU 0 YFV y3|g"_X;NϢJ'TY;S*+vkbG {X-["#"i; ~DM/cfP6dΌ$͒m_=7VpO pp;6N+,[O]1|XH~6 km2[Q}qcUÜVo?m^ۨݵ>}p\`@3!+6x*?P o< mw5<ʜyZ #(dIRN|v>UX Bȇ^8ib-oo;3@lej#m2?/x[F3REb9ki![3O~Ѩ)/g9Sl2|>^^0hGؖSxw +T%%>8ͨPqvir%aG99„#}W).L.6g9QɀTs&P)\q7U `wxnu.`! ]@uUCT 0'Ɨ"vwxfBѻ{ck2g` 55 Mˎ@,AQ06MHh .[DDDZDDZDDZDDZDDZDDZDDZDDZDDZ>zsfrTw`v/߿xUUhUUhUUhUUhUUa[OcGIH /RT@"U*@ձ i(E Ux*H4 TG(`Y "7?7j(>"#&aTkUDD>/,MOpGRCtO~^^CT H@Fܣv҉ n޻-A5 2p'=B߄`N,ŦU$@kZ\F?# A|vTiGLzT!謤Ἁ\n:{g⌺"Ȗc22TfFq@#@|ʕ40YM/`mlm="l{SXvL4K!nM'ݐB/ 5͡er>ly*evqUfxħ:gkG˓{;UwuPڜ!HlaT6D,ED#(&e$ER1YbiXi&jm{}uY\{V|~~=~9sX LAGGCWfXCt=z:E]R]=m:["iT͏TKDOtRys1 ;O^ Ї]9/u@V7 ЖB(2u9//ZLWP֚[M5CJUE@ŃsxdyVO0t3TA-jjף 3YH~˺lZh\{XʬY T*n< &۶wpcyFv5\ NXF頋a,-pW# x6vxW{h0߬]@ryFh 1%?ʐYf N b~ w9+Q!֫QD:YEXo}^He:HBu vsUF/ t5DXAGK \*>8V1R埓s˿el$` uA<@&U=G58j3pqmD4æBW$ %luw>}*)$i3f,Ð.1%%B>Sfg̜IVk?8(Io^H68]>T'5mڴCEnXGQ@_^%GVCts#Dmus]q ww]DanFmꨀ0}L1F!CÎbɤCi3CBIzz8.c{ $hC𮲬^eT'y\λ G`1 vN-HHOJtJv0ڥ9u 7Cila%Eb f/` }aaKhe_o c열T01-69xTm{d\!4U4 q/ٲo43٪-l,C(%ntiY*ĤZ!+\B%*)ʨ.KVC6q~H5jt3?՘Tk7҄ b1{P/ðf(dcbMHlKSR}mRq@3TQ]mFy&9wfLu"M1++hr8OJ}@/ѮՆsjpca++_ӳ| KD9r^ F629˘}! }l1<_bhh&!A6fg Ȫ(]eM3Ree\Ú_Seh_/]ت]aM{SDbVN%Xq؟'K 2p,c_ʃJ5رǃx@ rkU̹xwGK-B Qe)2<ąqUq{ҴWIPكԼ) uARlR3Ҏ#SĈTmHC=J©Ju+&.pliIԈ4Tܳ2ߞBpjƿrp ]]{!V)_ r QV!&Uض]I'C<$5畗ӵ =FE< ʺ$ꌷisnH5&_:๼?^z霨T jG9EH+U9tX&^9 Jۥ$]6 < ջCC Ov a> J7Ε\w-I5ph>n9mx\SlIդZN떷ɡLE5XiA7`os b6wVZG7+ޥvL#O ҵSdX9O+8iYQ@J8-q$˳ H5رǃX^].߅bM[D-+6OK.eqA 'աCc%rlfjIU܏*xE4zh&h.;U!x"P-FlA5xX-m^!&E 5ˢh٦KeQeB\-HliY1f[sԠ6IyXIVwUaBɃt?AQEcK*T]r"HfavMAJ#iMXHn}#i(gT1SWiX*2P 4|_W":֕K U9!&zRGSrTG@D߿bKI nCDF!5j\kJ6djSbݼb y)̿Չ4vn]Srr=~Nj)4fFd3%(u:iH5\z";y-Hpw]FI(Pj{P&6uYHVj c/;ߗ(03eo] Ee;DBFZTFP01"%Jeu 9 JD/yd~έ|s(HcO*oY\u6O>i&o1vJ@˲ק`%z2zRz11q0S@PQZrh8#2dYH܆6i^9$nI)\ګ0z1!&3՜)0ÅD:L8\Cfa'hRtȰX ^. RxؾTvk&G͸0q%HXYHѨCK2p5F0/ TdTkmbN @)C5*b=s{99if^) QAO(1M!&KElJ;ʅ|aDrGC.fxВ=ݞ6mc8ϗ3Ԃ R/7rg,bC<(qYH2SMZQu wa{Pg"lTC̲ml(\ssqΗ:/y'cDf8&䴱wQ|  Q6E,Ǝ[:-*s=맠.#٥lvKӇ~j{HkG10Ry9,c~fz?OR{9̘@:GF~%rYY~IZ5m|LwX$O㨩?5특CE4i*ۃ oVPMrSq˚v$G rC^MZiKޝw̉5Э]w%| SĊ= L C2'!.S="?CkeT E4km&Q ΕdjT žquvEvD2UB"?BAծ(SUP(Re/&g?q'I&LU;((0U 2 <{{pY+fԓ4QQhDDbUUET@TaW6@6H J_; WK T@E U"U*d*HH Y Sm@?@ՏS}jl I!à`J<@T@"U*H -R@T@"U*H -R`A^r%ĵb)X"aCcEXOr{%n؍%h,1F5?73 #FDv9wpo}wvBBP(2UBP(* B^(SU( BBP(2UBP( 7Ud2]ъ_gA'ɔkT, _:m&jOY-xtseVa#W{CsK :kOF ~.Lo?IHqyOTzCs[H%, זoF8@Ywb`0+lV.i A{yD]zyBݚ_{o13UV`f=Ɖ,5>lXZ$.@jH0kYzSmc9\oű6$#)fKlv!Q3J P1 R_܏/7&q[$Sua ƹVy)1"ZX8ۻ6o5Y`;K&DjoPE'k`ZF t-Y_k'S6YrFVXmޡe?yNu}X%#/;$YAjWq1tlT}Y[+MN{ Xy,?iX=/xoR/("K/)Luxtao!Wi!Zֳq[Q3DP V*fG'dfLbAC 9&6QA>vߚ*cxˍÓVϲuQnSשIQBEBcFgSʪAB2j:U{]ɣEVbl0B1oBz&Xa ILBfѺ/nu˸ B>[P<)eaOS}̛ͣ*eCeKΡ1iY".at(O/Mwyj>lu –EI]ƟU/bgvJ] fMn{FD 8tĖIʦ)bL4؆"TVj\^٦/SQe ։g!k(fUCeNr$aeCf&"-Lu K>a od6Dw7݂mI MD2h]zTO٫-tN޸q{9Xa-*[E/}Ob}ջ^=BhNG#Jdoc,:Dll h \A5f; %;kq:DZV,* rs S$Ǥ&xj @(Sv~ʃꅪd[ O)^Ѣa#6PrgbeݳɟC\ٙ$)DJ2Sҵg]q}h"UWW,_%bO/EGǫ錴Ɣx–ZlAD)jûɥޯnZlnG_O7r ,T1h>MZtƄwslgК?n5/:Lm8(~<83' mI*H`5.,+;I "b=GXao^bVjS": vMjNV#_e M$0Ui4*.yVu>LG۰&w;.Rp*׵g})Z̷xX-1(em`^2\b "rʤa\ǫs*q}gd\BDb3mGLbss+X!$ o }}$^Ot?۽=f=fWz^*ns7rYH|UMyJmCl(V0f8KPxs /F3SU*0=A8(bQ `1CDx:^➋3tETA.L<&l͎ z+D{ 0f҄]#`w ‡ӑ6o xUgf=2NL5$iDIP77o ʄؤk4Ӳk䟾ϓSe _BN+QAnmv"qD`5ălCE6':򀓮z,m6~x)*n8i}߻N5W iq)D6e #Эmj'nVv?Q0DWq\ATIk{X=#0²r0 ,JO>74Ug~Ԓ:̪>XUTHGsJ[I}]tAZ{ʻ>;$&Ǻ&%+NMKQ5$7hO<6v2ʗ+;CQE PP K#<CךN; ZƃASڽ) OO8evG}Gչу1#f*u("H,~qV4 bC"Em@{`pZҼx >J]t3_IJMJ 6q?8aqW_3*1YqHTu6c +#XBQ{[|\T/DN)fxDT#o;owT`8_Qzw~^%sFv:*iݸy C3xmm;% AV+z]:s2MLMfpk^xjq-4{c!UY¨ iGTu6a*Y* Q-(ASQK GQmt`B֨=/F-5V-Zøî|x(׶); |roU淰hNz@G`TTIkpmsY f-gw/RY<D^yonkLMfp$r=:dlzQ(.nd #LfuF5摝#Pܺ6_HZdZPQ*EKdJ0/LMIɆ&v/v3=l$D5F x%km/ݐcה`#`)NZTVDk sb`^@qW&&];D̮CSRK[T'Q/ǿ)QsFT 6) Fہ1jBZ=|D Z0v~g<0/G n;֟C%XMQ#jMIk)sEտ0P7lkaH|vobq<+f \DV!Bܕ I1&Z]}Ep^Y`|V/qM0Z80jɨAkG&6_j/ð YBkh5k<<ĈjRt}UiMH!D5Cv[ۊKȬ|el WݷUp)iET0 W?C?$nR”ϮbdՂfEqVg_LV,x`ݕ I׌1+2뉥aG˔ tIGVLͼ@+L^ p48q60$Ol^poGay*etZ;̛>jkּbQmSMb]vbp OTj%4S ye - V|"bSTl#ۯnJZ#Ex.`W!Opk14d[߽} gcv>S I7o]t~W,ȔuRR*ccFz ĺc;ZV3޿W8j!1]-*@  )y_pO1ꙉj6Pu^QXK̭rW+"w VZ8v:3:Pl*a^TQ[HkM!8;3Q~c9z4/O|$:! GZuRdu6pe 2!6q Y87{Y{"r6#mR xipeig5-ho2X>JQ%6D""1n  iƃw@ze(glC51i }3#dnvM>gf%5x 1퍕}`ϓܼ^ffFX8ԔFM̳s<X.{&|v9LB/FmhmB`ڤ M?#4@ܕ I׈Ct֟g#n*6.#)}U=p7﫪~l6cj붨*A({}bW^T 6qwP )m`}*w,F|'p"EPr;xȼ%: hf,m—XR}Wgilv= l͐o8 n*cg :7_ً|`/ARc4DA5ᳫQb7k>{W,[?}I$Qjd {LV%E5 '$B?aד$$DaY}o?HjRTOcm[ܻ  ܃ƎQ 9Zλ zw#w5GUJ-ؾYD{ҋ**dUU" ET@T @QQ, YDxٱca0hc:DK "X4 !DbUUETUT/ި^N@w&`CT@T QQXDDbUUET@T QQXDDbUUET@T QQXDDbU\JɩuK:\J:RCCܛ_M7nym >JSߎ|gڟpNЌSݩv5iXf@fbg]0chxBD/E셩)+E,aETS}{9칙+w/wG^=ss6pQÚrf"j.zzc\t&6h$ .*jx5- 3+ER}+ꢢեl,\*3gf/뢋%3#H,x",B51 @9U)(ZYJ"<GI_Xn>_Rv(wL$8_&cGJ#OqT5ߘA83+JܿEw)r !(Gg~?p}bsyf=nf>ovrԼ^U'svR^Ot,$jf-~c=EKyM"WsgpJH(B3ZT!Dџ:Ll؟Y#H˷E3rIT ;w% *3\53Xnj|P"~ cոDQЦE̬ᛘ*4`AanpBaȰ:f.{xO!qq~/UlţCb\ UHqP8ӈf8gWITS6"=Q?~ZhUs1'- p{xp,;xS; 8=yp`*_pUNJ kzdA],&DrkbX=Y/zvJQSihju˹D*WZi0 )1HɁpBgaL-)U B=UOֳjYM#B[p W-{IQ|졙OhNuo;'&ۄR:_jRmsïlGYPΪ8av8Sk,X/e%SBDx%jIï%rVtD绿 24VX/RJw3U/LOO:&bK$ &9C8JfG쾫MNՈU='5z{( -> V)T[xYǡ?_zأ-k1tOoW(*KWt0|9wطzp1jGfn>WpP'-& !ƛ}:v詢U4c@P 6M& BvN et*MȔb،2QtO8~>(QtUeQe8!"x9@ ,KYy=D0O#VP ݙ6%(5_Eh{:6lZr$U84*.! SyحKTݯm@a|T#OBWuP.T9}EWZ33#ssŹzGMWjDy S mtEgڝs4ѐytt@B*Xb(%j8lA:(LƇJ3 cykFƒO\A"T(yhu[=mBTۮ Y#چU$KZ£?l𐇻O-&unX6!T$e[&=oژdOL|h1[=?UuܼvqUlpddH{hD&-uD5&@{9U#}FuURPGCDUY?J!SZ@ "qԈ0'Q54Vh sVʞ{~Z۝4F0烨BW:*25hLi?Ehm]G.M"r)\s`ahb@ a(%5"ނKL s{'R66;n ZDXc%FWTKy-<- QZ u:aAou('@]d:[駕~fRږ|@9s8488,&ctjئITc\2˫U NGcw:il4Ux|\t jV4s \lh?XG/154Ĝ+۫m?j6al@V^7{? 6>)RU+boA2*bRA }i>v,%xx6E(a9Fx(N-JOJ.\D5J%7ʒ/8$w qZ)QsUYp%S<۬$#E39BSe8Di,Q3fpXHÑ}fJOUqEu pEDW22Չ-/W˚%̻O{pe S$K$4M_c}`>e,k|G6taBHmgTJJ_TĪ Vh-^Q^Q0bV }F_>GP-@|ZʈjMZ|8"lv,0|&QZbΩ zQmo.De/hv$#v#Wi✪2BY{VssLFK$9Qϸ}GNhƀ%|m<ÿw*]>3:6A~G•Ef_FN]=JÎuF]Ѯ} Aއ FSFTcllfFډ$Q^;1b为ݭE0!J%y/JTמ{*7:64Mϙ1ӈDB.]NaI 6'n~J.b$f2$H.^U`#7;^i_acy;Zz=.Q@IP7Pm.+}QÖs i.5=6mf8p:4<Ő?ÑQq'x{ӻ/GWlj|X#dlk16HT/Hx03i$GO<*Ղ]odl.~F+PMxF鎌vL&>?TpT 04V ُzG]\S0jC/Kqw$}1uV䙈L=C=qx4a9𳠝w{B)\鋪T؀~-dR-b޿䝽0ckKr߃%ةF{wy8zR f3X}zF^Kmկ (nSH[O)jA ʨUSd&uٌ1 vA|tyܠ~Khm a|DEU*Tg\^?ó5`LvsZ;GKQlE%(&v7vFN׫]| GC艳1`4y'_K^cH&>lp73AjiCoΠ#l\j ͇XWׄ*͚C\kVݝ Tsܙ(&,9\銪T4) "hr6ck,}(OϾr'qv/m~u-LX>8206_cl߿TU DVxzAZP|xVN?"Rk[G $IzU]د$E )䳰˶$pHIAf˿HL5$_/zu٧aoO?a}R7XYQ\jEH 0?SnN&wmV7ۙheƂDv'q3׀̕8 Qyn!u5S%Z0L<㤞1>ccaIM‘L;ʛ'_&Wt-O(u<#, W=7\ 66|ߘ1aܯ.粜Fh#$:PxHCm,ƫ K4UfT}0F8 T͕Tv"H2HIمIn]Zh,=^(pN]RMc<=ɥb|kwhĸ<vZi)];1hCI<Ր:j6F\f͠j @K6p_蓦;f#`]I%4kvMgRŷ>9 k>vW[7cj/U7b= ؜Fe$1Ϛ0'l'2Wa[)B"ژ 'ꏑ4N]b5R" 1T(%.%Vk?5Y 9$ZPsR3YÚ*#Mtldzt.w{<72(G*TAH#6Lg9U֗JmunDe0]JQ>R;쉐1S . ShWC݅V-.|jNd3 9t^i* '6xQ`I Վ̡"|QGNpL527>˨?pgŲ95Rgj, \TzC/Xy- E>c%%^ippفbSҷ;YL 1tK{f$`mOAr"`0V KB- ,Ү޶s{x)S:8"_myr5ޭ+xY4YT8<T@KL]jDJYwM ps8SCxV-[0MCѮñq.P;eJSi% {*q*uSP3Hm@8]:[ ٴEKЃ"Sj;xxۅ@4-YHώ̓.fEHTvBDLjy??ہא:u65 ,, P~z+[=n Q)բ:4J@R #S@.BĘp!T jUxǧa44%\y[ʧ{z{>Y#2x9֊VvGjkE>hEBTAJy:.ب{F836j6@P~<=l>1mXٳM>ٲ;ˡ^urXJ$JU/xpkE3竤NoeQEZW1 #+C6J/R } i4)Ul!R 7qm)V;K"9rTXKgW{n?lQ$THj+/bCS@r*Mhq澮AUl1%bK0/DaF\{F5xUltQ-nvjsl.OA'XB뜁_`j35ƌŔTn ':0 m•K;U,~2:.F`R8.j`dB$$بQi+[T{EM=&K6V'}NM_UE@R1kJPqF5ņ45 .GB%4cnaU@T)m>b`JCNFNUxŀ3}v?{ⱈ^Dp+ P?5l6 ޢV3Ls(_K9As,l&M_bslJQ >82y]>qU%~/HxQF:ÖM;DpAlmhj@_+|],P#x˦: ˹Ӈ@qyqh[IOo&}s6׺di$iب}/^HwRz*b_T(ɝ:|dG`PU\'V| 5:NX.]>AQUئ*_b.KhF!~ e1 8fenKsK7wdN_bГAH}0Zŭ+OQUǷTxX@*u{|01r;j *aAM' lZBOT0XװQz8)A7^L!E*a+v(L[yܧ|2HX aV >ϼ"xx] .=%jlSE~T5"֛8đU{t!v$ɈPHNbTʄ >r%%^wʋ"5$2a)S DV`ń{$k_Γ7A߃ܭ\T@z?ɋ>GѱQ+f tߌS@X6Q%y3gDm`[i|@<=g! QCrCL\T٦ՐkN2|Lᴮ*BDd*pkOT)?sg:}1#{9Alm81sUSpAlmhZ@pV6s/smQ6Un#,y̪ӼGYڈ 7d 8:(.yEq<K6G岋3 S 1tKH4"QBJgOMz:2أMt|4$zxUzՁ\'jBFT]H#3ŘГ9^ѯA%m kʃдh]欔x|gcV8Na~ư]j?/pC-d"Kج Ⲵ}cx蹍!*yl3cOԳkvq'3i NwFlž_;-mhlݐo"Fwfi#h>R1v#;7G̎ݹW\"eFg:}1#Ǿ^_`C8m-\y[P{0oh5Q>VZ9rshN4Lӱ9N^\ m&h #GX6JqbJ#$.RR f:alCr1bF:/shz@,pbl_EXg]_QoA& qCRtj r7Ap7 "D?Hj5`e p0@$dl kb! y66o&0b(#ڝ1HR&aN__DfLBt;l*FiILx:l#ÄAy0KN?/`PnnQb,G]whU?)a-@2ؐu z Y+yr dlj٬BA_,҅;ma8 z5 U&bKc"I`!g~R%C*{C*p[| `Ö3QPLÀܛ')gs/9`Y `*,9Z㋟RMiRBR뙺Vg3[/Uq-X]3z_BZ3aWdI*`>&aLTS IJ"IuJj+]5j<aRk)a;EH:9&f6x֜,-T U*xIiW "džUqV;\%2_nSuf6i 1/vŵ-C7$v۷3: j&.PnDVH)_Bþ#qR:F^~Nm/:,s͵%X1(rdD8TOQ ֖@Q߻GE\I5ChaK2'AGa-3JuϽڿoOx"ʃ 3d TIy 2hK@TaMNTXT-!ϟѿh'ťXCoe9(~#d;XG.+-[ ,N#B-?)a3}`ԹL<1V {{ z=l`}J&u$J23?EgLa9 c̯h abX&bE5?R g$I+Fn)?$4g$x /tЩzsL5 נ8F^UnW [rz~74˧5"-UjBiQlP{l^;2 a CUN#k u%&A5O% c3h0Jb\ĭ=*zY2j"lb<%Ңsy*p'{ J5?FBLwm\SzӾ`*X%1boda o>9\i*w' LX* ; kY(hVu  T|0w取)Pƍ?1svESAa2"^6)hz~|X_L,7U>Ci(t\?TY)tx^P@"ȣq(y'zI0YJ0@o@&A/6zz*_\cߎTngcb\9ŘPUW{|(bs6N]š+" =;n^3KGai`Bƿ%;T A3f@]gPe>]`m~a>T'陲Ϙbf7RiPL9I4ri3s2žNME4Q@9?={pEJd cC+ץ P]"fq욜K/Pet]8JU&p,PULA%RU-|"~P Dq4i_~=Dy^"iX9W.GPU Hk\թ/{~UBUL2Oco9O _?j;UQt1ʨ[˼d&CձiՓ(>du&JZE{Ed`yR v aMR89*|~]64?u)bߢ`qfn@=RuUmPU{gYCIőx'3Z䍕Z>{^x\8\UPUѳ]ٿj/4j bؽK&U(%YX(B;#k74>毆ݥmPH@ KAcRjI,ec,PUMEE T|TU?4F5L 6C\.*г+n+MhYc/-D3:A5dGDz"r/ժX6|J C5/yڎXkK޸VGp[ tV}V WtzFuQے"Ӹd_?P*Tp[B5 )~Pㅩb}CW7`Ҁ3vI%,< ˜ cĘ2.Xا ;q A NJ;Tyu!ƕUڄ'lc;HPfU2UD,5̬e/U^-C"(eepVVSբ^WtUZfpH]Y LAuq2)5t, ?U<r U S^M8x  >qGN}7:~x\Q P0)XP /AFVo)[wظRvRB9s9GS&,RIɠ oG$GPeZ)d;C^Xa]a'7(Htd!QFjl4x^]yڠJ.7JpIPKIJYQXQɃhsۧdJ@OoxoUPN OUz̗~N&գww-$~p:?Qۘdr5:jPM9R-݄c>64 z*>X@leTrAw >m5*[UNT'Er|ʯ]IUUYt*T%ctͥuhE<Xh H"(z+õJu?\>ح5g|dPoT[j*zY*>[fYq-Bk~:wU5 Tju~.L2\Rf1 ,VrOe8t P#8jnnVri#WnC5*pIY)T_֒Pd(S:V}Tɭ,U;+*ЙVT젃έhְ>-U*^h S\C+D*-"^&30RdtKrU@=N /h|HY 0mqL(-ҖK=az%k,ePE~_&A\4md:LH9[uh)U8_[pNCz]+u -b$Pd9*Zu9&oWJWF3JIw.֢-j],pqЖb{;jCHhi kTaJЫ\)J?TiBp[}4i6z fU Ox <:jr1TTyZ)^:x>v9Ӡj)ܺ>MU7QmnSj8JnP\ bdyMT<}qzV ʗ'z ܤ(M{;Y-{bXgV\9v6uf.̥ytgȎ a7 Uy{$iP7m#RVd%;MVZ]=wo)kPD2)5ͽTbjN zo̭l _^hO ~㛧vsd*Wkѡ@XG<1{XP,h톓|TdWN)}dvȗq ET- 5#aG]bLʇs2S&.Za:eowj؏{lZZbMKyJBu<+?pwUFjx|dRM>3'^l7ˎ\ٗ\^꿡pUvYUL޿މISƪCՕ+W?hC>;y_{?طca0 {L9A:wd,LqkS"U\E~<ءU3ku.OE5^>_W?zDTt=GطD3 ܻ92 QIT(MON ATm>*pQQT:O|oS[3j8OgyQ?Q:ITZzMKi 2)VQe tF$Il]UF @GjZik8*CUDNET*HTnեtiK޶\nf*CUD\ԥyr1sޕW݆ҟ$U"mD~دc a(ý+uf O9\b!>cLHEȩFco68ҞMo:^Ӟh|WqJ 4Q ss$ @3(s|X*)*wYqܚ?8bGKyvpwrGY;8KT;ri$QeXUSiOT@T QQ\DDrUUET@T QQ\DDrUUET@T QQ\DDrUUET&' h371e\ap-m 1@Y#|*@T`\DDET@T`\DDET@T`\DDET@T`\z3gGuZ4mT/X @̜DD_r-2sz>/a]잪oVUhܾT.4yʪėtVZuUF7/YrnNr<˪o%7f8%7.@ɭ8j[}@? 첋_i']+=pR'5+wIENDB`fontawesome/man/print.fontawesome.Rd0000644000176200001440000000111414605637270017334 0ustar liggesusers% Generated by roxygen2: do not edit by hand % Please edit documentation in R/print.R \name{print.fontawesome} \alias{print.fontawesome} \title{Print the fontawesome icon to the Viewer} \usage{ \method{print}{fontawesome}(x, view = interactive(), ...) } \arguments{ \item{x}{An agent object of class \code{fontawesome}.} \item{view}{The value for \code{print()}s \code{browse} argument.} \item{...}{Any additional parameters.} } \value{ No return value, called for printing to the Viewer. } \description{ This function will show the fontawesome icon in the Viewer. } \keyword{internal} fontawesome/DESCRIPTION0000644000176200001440000000336714716153232014324 0ustar liggesusersType: Package Package: fontawesome Version: 0.5.3 Title: Easily Work with 'Font Awesome' Icons Description: Easily and flexibly insert 'Font Awesome' icons into 'R Markdown' documents and 'Shiny' apps. These icons can be inserted into HTML content through inline 'SVG' tags or 'i' tags. There is also a utility function for exporting 'Font Awesome' icons as 'PNG' images for those situations where raster graphics are needed. Authors@R: c( person("Richard", "Iannone", , "rich@posit.co", c("aut", "cre"), comment = c(ORCID = "0000-0003-3925-190X")), person("Christophe", "Dervieux", , "cderv@posit.co", role = "ctb", comment = c(ORCID = "0000-0003-4474-2498")), person("Winston", "Chang", , "winston@posit.co", role = "ctb"), person("Dave", "Gandy", role = c("ctb", "cph"), comment = "Font-Awesome font"), person("Posit Software, PBC", role = c("cph", "fnd")) ) License: MIT + file LICENSE URL: https://github.com/rstudio/fontawesome, https://rstudio.github.io/fontawesome/ BugReports: https://github.com/rstudio/fontawesome/issues Encoding: UTF-8 ByteCompile: true RoxygenNote: 7.3.2 Depends: R (>= 3.3.0) Imports: rlang (>= 1.0.6), htmltools (>= 0.5.1.1) Suggests: covr, dplyr (>= 1.0.8), gt (>= 0.9.0), knitr (>= 1.31), testthat (>= 3.0.0), rsvg Config/testthat/edition: 3 NeedsCompilation: no Packaged: 2024-11-16 17:06:16 UTC; riannone Author: Richard Iannone [aut, cre] (), Christophe Dervieux [ctb] (), Winston Chang [ctb], Dave Gandy [ctb, cph] (Font-Awesome font), Posit Software, PBC [cph, fnd] Maintainer: Richard Iannone Repository: CRAN Date/Publication: 2024-11-16 17:30:02 UTC