From a61f166012bf24c8ffa0ef08f58c67914ecabc33 Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 21 Jan 2016 07:13:31 -0600 Subject: [PATCH 001/104] Load magrittr --- robust-code.Rmd | 4 ++++ 1 file changed, 4 insertions(+) diff --git a/robust-code.Rmd b/robust-code.Rmd index 9be2af0..152c577 100644 --- a/robust-code.Rmd +++ b/robust-code.Rmd @@ -3,6 +3,10 @@ layout: default title: Robust code --- +```{r, include = FALSE} +library(magrittr) +``` + ## Robust code (This is an advanced topic. You shouldn't worry too much about it when you first start writing functions. Instead you should focus on getting a function that works right for the easiest 80% of the problem. Then in time, you'll learn how to get to 99% with minimal extra effort. The defaults in this book should steer you in the right direction: we avoid teaching you functions with major suprises.) From 9c0bd89f99f1deaa5ae39bc577600f233c8111b4 Mon Sep 17 00:00:00 2001 From: TJ Mahr Date: Thu, 21 Jan 2016 07:57:25 -0600 Subject: [PATCH 002/104] typos in relational-data.Rmd --- relational-data.Rmd | 8 ++++---- 1 file changed, 4 insertions(+), 4 deletions(-) diff --git a/relational-data.Rmd b/relational-data.Rmd index 1024b72..501ccab 100644 --- a/relational-data.Rmd +++ b/relational-data.Rmd @@ -316,7 +316,7 @@ So far, the pairs of tables have always been joined by a single variable, and th a suffix. * A named character vector: `by = c("a" = "b")`. This will - match variable `a` in table `x` to variable `y` in table `b`. The + match variable `a` in table `x` to variable `b` in table `y`. The variables from `x` will be used in the output. For example, if we want to draw a map we need to combine the flights data @@ -429,7 +429,7 @@ Graphically, a semi-join looks like this: knitr::include_graphics("diagrams/join-semi.png") ``` -Only the existence of a match is important; it doesn't match what observation is matched. This means that filtering joins never duplicate rows like mutating joins do: +Only the existence of a match is important; it doesn't matter which observation is matched. This means that filtering joins never duplicate rows like mutating joins do: ```{r, echo = FALSE, out.width = "50%"} knitr::include_graphics("diagrams/join-semi-many.png") @@ -467,7 +467,7 @@ flights %>% The data you've been working with in this chapter has been cleaned up so that you'll have as few problems as possible. Your own data is unlikely to be so nice, so there are a few things that you should do with your own data to make your joins go smoothly. 1. Start by identifying the variables that form the primary key in each table. - You should usually do this based on your understand of the data, not + You should usually do this based on your understanding of the data, not empirically by looking for a combination of variables that give a unique identifier. If you just look for variables without thinking about what they mean, you might get (un)lucky and find a combination that's @@ -490,7 +490,7 @@ The data you've been working with in this chapter has been cleaned up so that yo use of inner vs. outer joins, carefully considering whether or not you want to drop rows that don't have a match. -Be aware that simply checking the number of rows before and after the join is not sufficient to ensure that your join has gone smoothly. If you have an inner join with duplicate keys in both tables, you might get unlikely at the number of dropped rows might exactly equal the number of duplicated rows! +Be aware that simply checking the number of rows before and after the join is not sufficient to ensure that your join has gone smoothly. If you have an inner join with duplicate keys in both tables, you might get unlucky as the number of dropped rows might exactly equal the number of duplicated rows! ## Set operations {#set-operations} From b359976f3ac2c6608d5282d2cc2656805eeef5e3 Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 21 Jan 2016 09:51:02 -0600 Subject: [PATCH 003/104] Starting to work on expressing yourself --- data-structures.Rmd | 49 ++++- functions.Rmd | 469 +++++++++++++++++++++++++------------------- lists.Rmd | 121 +++++------- 3 files changed, 368 insertions(+), 271 deletions(-) diff --git a/data-structures.Rmd b/data-structures.Rmd index 4abb782..c450bfb 100644 --- a/data-structures.Rmd +++ b/data-structures.Rmd @@ -7,14 +7,57 @@ title: Data structures Might be quite brief. -Atomic vectors and lists. What is a data frame? +Atomic vectors and lists + data frames. -`typeof()` vs. `class()` mostly in context of how date/times and factors are built on top of simpler structures. +Most important data types: -## Factors +* logical +* integer & double +* character +* date +* date time +* factor + + + +Every vector has three key properties: + +1. Type: e.g. integer, double, list. Retrieve with `typeof()`. +2. Length. Retrieve with `length()` +3. Attributes. A named of list of additional metadata. With the `class` + attribute used to build more complex data structure (like factors and + dates) up from simpler components. Get with `attributes()`. + +## Atomic vectors + +### Doubles + +```{r} +sqrt(2) ^ 2 - 2 + +0/0 +1/0 +-1/0 + +mean(numeric()) +``` + +## Non-atomic vectors + +`class()` + +### Factors (Since won't get a chapter of their own) +### Dates + +### Date times + +## Lists + +## Data frames + ## Subsetting Not sure where else this should be covered. diff --git a/functions.Rmd b/functions.Rmd index d4379c5..ec668fc 100644 --- a/functions.Rmd +++ b/functions.Rmd @@ -12,130 +12,145 @@ knitr::opts_chunk$set( ) ``` -Code is a means of communication, not just to the computer, but to other people. This is important because every project you undertake is fundamentally collaborative, and even if you're not working with other people you'll definitely be working with future-you. +Code is a tool of communication, not just to the computer, but to other people. This is important because every project you undertake is fundamentally collaborative. Even if you're not working with other people, you'll definitely be working with future-you. You want to write clear code so that future-you doesn't curse present-you when you look at a project again after several months have passed. -After solving a data analysis challenge, it's often worth looking at your code and thinking about whether or not it's obvious what you've done. If you spend a little time rewriting your code while the ideas are fresh, you can save a lot of time later trying to recreate what your code did. +To me, improving your communication skills is a key part of mastering R as a programming language. Over time, you want your code to becomes more and more clear, and easier to write. In this chapter, you'll learn three important skills that help you to move in this direction: -To me, this is what mastering R as a programming language is all about: making it easier to express yourself, so that over time your becomes more and more clear, and easier to write. In this chapter, you'll learn some of the most important skills, but to learn more you need to study R as a programming language, not just an interactive environment for data science. We have written two books that will help you do so: +1. We'll dive deep in to the __pipe__, `%>%`, talking more about how it works + and how it gives you a new tool for rewriting your code. You'll also learn + about when not to use the pipe! -* [Hands on programming with R](http://shop.oreilly.com/product/0636920028574.do), - by Garrett Grolemund. This is an introduction to R as a programming language - and is a great place to start if R is your first programming language. - -* [Advanced R](http://adv-r.had.co.nz) by Hadley Wickham. This dives into the - details of R the programming language. This is a great place to start if - you've programmed in other languages and you want to learn what makes R - special, different, and particularly well suited to data analysis. +1. Repeating yourself in code is dangerous because it can easily lead to + errors and inconsistencies. We'll talk about how to write __functions__ + in order to remove duplication in your logic. + +1. Another important tool for removing duplication is the __for loop__ which + allows you to repeat the same action again and again and again. You tend to + use for-loops less often in R than in other programming languages because R + is a functional programming language which means that you can extract out + common patterns of for loops and put them in a function. We'll come back to + that idea in XYZ. -You get better very slowly if you don't consciously practice, so this chapter brings together a number of ideas that we mention elsewhere into one focussed chapter on code as communication. +Removing duplication is an important part of expressing yourself clearly because it lets the reader focus on what's different between operations rather than what's the same. The goal is not just to write better funtions or to do things that you couldn't do before, but to code with more "ease". As you internalise the ideas in this chapter, you should find it easier to re-tackle problems that you've solved in the past with much effort. -```{r} -library(magrittr) -``` - -This chapter is not comprehensive, but it will illustrate some patterns that in the long-term that will help you write clear and comprehensive code. - -The goal is not just to write better funtions or to do things that you couldn't do before, but to code with more "ease". +Writing code is similar in many ways to writing prose. One parallel which I find particularly useful is that in both cases rewriting is key to clarity. The first expression of your ideas is unlikely to be particularly clear, and you may need to rewrite multiple times. After solving a data analysis challenge, it's often worth looking at your code and thinking about whether or not it's obvious what you've done. If you spend a little time rewriting your code while the ideas are fresh, you can save a lot of time later trying to recreate what your code did. But this doesn't mean you should rewrite every function: you need to balance what you need to achieve now with saving time in the long run. (But the more you rewrite your functions the more likely you'll first attempt will be clear.) ## Piping +Let's use code to tell a story about a little bunny named foo foo: + +> Little bunny Foo Foo +> Went hopping through the forest +> Scooping up the field mice +> And bopping them on the head + +We'll start by defining an object to represent litte bunny Foo Foo: + ```R foo_foo <- little_bunny() ``` -There are a number of ways that you could write this: +And then we'll use a function for each key verb. There are a number of ways we could use functions to tell this story: -1. Function composition: +* Save each step as a new object - ```R - bop_on( - scoop_up( - hop_through(foo_foo, forest), - field_mouse - ), - head - ) - ``` - - The disadvantage is that you have to read from inside-out, from - right-to-left, and that the arguments end up spread far apart - (sometimes called the - [dagwood sandwhich](https://en.wikipedia.org/wiki/Dagwood_sandwich) - problem). - -1. Intermediate state: +### Intermediate steps - ```R - foo_foo_1 <- hop_through(foo_foo, forest) - foo_foo_2 <- scoop_up(foo_foo_1, field_mouse) - foo_foo_3 <- bop_on(foo_foo_2, head) - ``` - - This avoids the nesting, but you now have to name each intermediate element. - If there are natural names, use this form. But if you're just numbering - them, I don't think it's that useful. Whenever I write code like this, - I invariably write the wrong number somewhere and then spend 10 minutes - scratching my head and trying to figure out what went wrong with my code. - - You may also worry that this form creates many intermediate copies of your - data and takes up a lot of memory. First, in R, I don't think worrying about - memory is a useful way to spend your time: worry about it when it becomes - a problem (i.e. you run out of memory), not before. Second, R isn't stupid: - it will reuse the shared columns in a pipeline of data frame transformations. - - You can see that using `pryr::object_size()` (unfortunately the built-in - `object.size()` doesn't have quite enough smarts to show you this super - important feature of R): - - ```{R} - diamonds <- ggplot2::diamonds - pryr::object_size(diamonds) - - diamonds2 <- dplyr::mutate(diamonds, price_per_carat = price / carat) - pryr::object_size(diamonds2) - - pryr::object_size(diamonds, diamonds2) - ``` - - `diamonds` is 3.46 MB, and `diamonds2` is 3.89 MB, but the total size of - `diamonds` and `diamonds2` is only 3.89 MB. How does that work? - only 3.89 MB +```R +foo_foo_1 <- hop_through(foo_foo, forest) +foo_foo_2 <- scoop_up(foo_foo_1, field_mice) +foo_foo_3 <- bop_on(foo_foo_2, head) +``` -1. Overwrite the original: +This avoids the nesting, but you now have to name each intermediate element. +If there are natural names, use this form. But if you're just numbering +them, I don't think it's that useful. Whenever I write code like this, +I invariably write the wrong number somewhere and then spend 10 minutes +scratching my head and trying to figure out what went wrong with my code. - ```R - foo_foo <- hop_through(foo_foo, forest) - foo_foo <- scoop_up(foo_foo, field_mouse) - foo_foo <- bop_on(foo_foo, head) - ``` - - This is a minor variation of the previous form, where instead of giving - each intermediate element its own name, you use the same name, replacing - the previous value at each step. This is less typing (and less thinking), - so you're less likely to make mistakes. However, it can make debugging - painful, because if you make a mistake you'll need to start from - scratch again. Also, I think the reptition of the object being transformed - (here we've repeated `foo_foo` six times!) obscures the intent of the code. - -1. Use the pipe +You may also worry that this form creates many intermediate copies of your +data and takes up a lot of memory. First, in R, I don't think worrying about +memory is a useful way to spend your time: worry about it when it becomes +a problem (i.e. you run out of memory), not before. Second, R isn't stupid: +it will reuse the shared columns in a pipeline of data frame transformations. - ```R - foo_foo %>% - hop_through(forest) %>% - scoop_up(field_mouse) %>% - bop_on(head) - ``` - - This is my favourite form. The downside is that you need to understand - what the pipe does, but once you've mastered that simple task, you can - read this series of function compositions like it's a set of imperative - actions. - - (Behind the scenes magrittr converts this call to the previous form, - using `.` as the name of the object. This makes it easier to debug than - the first form because it avoids deeply nested fuction calls.) +You can see that using `pryr::object_size()` (unfortunately the built-in +`object.size()` doesn't have quite enough smarts to show you this super +important feature of R): -## Useful intermediates +```{R} +diamonds <- ggplot2::diamonds +pryr::object_size(diamonds) + +diamonds2 <- dplyr::mutate(diamonds, price_per_carat = price / carat) +pryr::object_size(diamonds2) + +pryr::object_size(diamonds, diamonds2) +``` + +`diamonds` is 3.46 MB, and `diamonds2` is 3.89 MB, but the total size of +`diamonds` and `diamonds2` is only 3.89 MB. How does that work? +only 3.89 MB + +### Overwrite the original + +```R +foo_foo <- hop_through(foo_foo, forest) +foo_foo <- scoop_up(foo_foo, field_mice) +foo_foo <- bop_on(foo_foo, head) +``` + +This is a minor variation of the previous form, where instead of giving +each intermediate element its own name, you use the same name, replacing +the previous value at each step. This is less typing (and less thinking), +so you're less likely to make mistakes. However, it can make debugging +painful, because if you make a mistake you'll need to start from +scratch again. Also, I think the reptition of the object being transformed +(here we've repeated `foo_foo` six times!) obscures the intent of the code. + +### Function composition + +```R +bop_on( + scoop_up( + hop_through(foo_foo, forest), + field_mice + ), + head +) +``` + +The disadvantage is that you have to read from inside-out, from +right-to-left, and that the arguments end up spread far apart +(sometimes called the +[dagwood sandwhich](https://en.wikipedia.org/wiki/Dagwood_sandwich) +problem). + +### Use the pipe + +```R +foo_foo %>% + hop_through(forest) %>% + scoop_up(field_mouse) %>% + bop_on(head) +``` + +This is my favourite form. The downside is that you need to understand +what the pipe does, but once you've mastered that simple task, you can +read this series of function compositions like it's a set of imperative +actions. + +Behind the scenes magrittr converts this to: + +```{r, eval = FALSE} +. <- hop_through(foo_foo, forest) +. <- scoop_up(., field_mice) +bop_on(., head) +``` +using `.` as the name of the object. This makes it easier to debug than +the first form because it avoids deeply nested fuction calls.) + +### Useful intermediates * Whenever you write your own function that is used primarily for its side-effects, you should always return the first argument invisibly, e.g. @@ -180,7 +195,7 @@ There are a number of ways that you could write this: cor(disp, mpg) ``` -## When not to use the pipe +### When not to use the pipe The pipe is a powerful tool, but it's not the only tool at your disposal, and it doesn't solve every problem! Generally, you should reach for another tool when: @@ -221,13 +236,7 @@ The pipe is a powerful tool, but it's not the only tool at your disposal, and it modified copy and then replaces the old version (this may seem like a subtle point but I think it's quite important). -## Duplication - -As you become a better R programmer, you'll learn more techniques for reducing various types of duplication. This allows you to do more with less, and allows you to express yourself more clearly by taking advantage of powerful programming constructs. - -Two main tools for reducing duplication are functions and for-loops. You tend to use for-loops less often in R than in other programming languages because R is a functional programming language. That means that you can extract out common patterns of for loops and put them in a function. - -### Extracting out a function +## Functions Whenever you've copied and pasted code more than twice, you need to take a look at it and see if you can extract out the common components and make a function. For example, take a look at this code. What does it do? @@ -279,10 +288,18 @@ rescale01 <- function(x) { rng <- range(x, na.rm = TRUE) (x - rng[1]) / (rng[2] - rng[1]) } +rescale01(c(0, 5, 10)) ``` +The result returned from a function is the last thing is does. + Always make sure your code works on a simple test case before creating the function! +Always want to start simple: start with test values and get the body of the function working first. +Check each step as you go. +Don’t try and do too much at once! +“Wrap it up” as a function only once everything works. + Now we can use that to simplify our original example: ```{r} @@ -292,101 +309,157 @@ df$c <- rescale01(df$c) df$d <- rescale01(df$d) ``` -This makes it more clear what we're doing, and avoids one class of copy-and-paste errors. However, we still have quite a bit of duplication: we're doing the same thing to each column. +This makes it more clear what we're doing, and avoids one class of copy-and-paste errors. However, we still have quite a bit of duplication: we're doing the same thing to each column. We'll learn how to handle that in the for loop section. But first, lets talk a bit more about functions. -### Common looping patterns +### Function components -Before we tackle the problem of rescaling each column, lets start with a simpler case. Imagine we want to summarise each column with its median. One way to do that is to use a for loop. Every for loop has three main components: +* Arguments (incl. default) +* Body +* Environment -1. Creating the space for the output. -2. The sequence to loop over. -3. The body of the loop. +### Scoping -```{r} -medians <- vector("numeric", ncol(df)) -for (i in 1:ncol(df)) { - medians[i] <- median(df[[i]]) -} -medians -``` +### `...` -If you do this a lot, you should probably make a function for it: +### Non-standard evaluation -```{r} -col_medians <- function(df) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- median(df[[i]]) - } - out -} -col_medians(df) -``` +One challenge with writing functions is that many of the functions you've used in this book use non-standard evaluation to minimise typing. This makes these functions great for interactive use, but it does make it more challenging to program with them, because you need to use more advanced techniques. -Now imagine that you also want to compute the interquartile range of each column? How would you change the function? What if you also wanted to calculate the min and max? +Unfortunately these techniques are beyond the scope of this book, but you can learn the techniques with online resources: -```{r} -col_min <- function(df) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- min(df[[i]]) - } - out -} -col_max <- function(df) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- max(df[[i]]) - } - out -} -``` - -I've now copied-and-pasted this function three times, so it's time to think about how to generalise it. If you look at these functions, you'll notice that they are very similar: the only difference is the function that gets called. - -I mentioned earlier that R is a functional programming language. Practically, what this means is that you can not only pass vectors and data frames to functions, but you can also pass other functions. So you can generalise these `col_*` functions by adding an additional argument: - -```{r} -col_summary <- function(df, fun) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- fun(df[[i]]) - } - out -} -col_summary(df, median) -col_summary(df, min) -``` - -We can take this one step further and use another cool feature of R functions: "`...`". "`...`" just takes any additional arguments and allows you to pass them on to another function: - -```{r} -col_summary <- function(df, fun, ...) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- fun(df[[i]], ...) - } - out -} -col_summary(df, median, na.rm = TRUE) -``` - -If you've used R for a bit, the behaviour of function might seem familiar: it looks like the `lapply()` or `sapply()` functions. Indeed, all of the apply function in R abstract over common looping patterns. - -There are two main differences with `lapply()` and `col_summary()`: - -* `lapply()` returns a list. This allows it to work with any R function, not - just those that return numeric output. +* Programming with ggplot2 (an excerpt from the ggplot2 book): + http://rpubs.com/hadley/97970 -* `lapply()` is written in C, not R. This gives some very minor performance - improvements. - -As you learn more about R, you'll learn more functions that allow you to abstract over common patterns of for loops. +* Programming with dplyr: still hasn't been written. ### Exercises -1. Adapt `col_summary()` so that it only applies to numeric inputs. - You might want to start with an `is_numeric()` function that returns - a logical vector that has a TRUE corresponding to each numeric column. +1. Follow to + write your own functions to compute the variance and skew of a vector. -1. How do `sapply()` and `vapply()` differ from `col_summary()`? +1. Read the [complete lyrics](https://en.wikipedia.org/wiki/Little_Bunny_Foo_Foo) + to "Little Bunny Foo". There's a lot of duplication in this song. + Extend the initial piping example to recreate the complete song, using + functions to reduce duplication. + +## For loops + +Before we tackle the problem of rescaling each column, lets start with a simpler case. Imagine we want to summarise each column with its median. One way to do that is to use a for loop. Every for loop has three main components: + +```{r} +results <- vector("numeric", ncol(df)) +for (i in seq_along(df)) { + results[[i]] <- median(df[[i]]) +} +results +``` + +There are three parts to a for loop: + +1. The __results__: `results <- vector("integer", length(x))`. + This creates an integer vector the same length as the input. It's important + to enough space for all the results up front, otherwise you have to grow the + results vector at each iteration, which is very slow for large loops. + +1. The __sequence__: `i in seq_along(df)`. This determines what to loop over: + each run of the for loop will assign `i` to a different value from + `seq_along(df)`, shorthand for `1:length(df)`. It's useful to think of `i` + as a pronoun. + +1. The __body__: `results[i] <- median(df[[i]])`. This code is run repeatedly, + each time with a different value in `i`. The first iteration will run + `results[1] <- median(df[[2]])`, the second `results[2] <- median(df[[2]])`, + and so on. + +This loop used a function you might not be familiar with: `seq_along()`. This is a safe version of the more familiar `1:length(l)`. There's one important difference in behaviour. If you have a zero-length vector, `seq_along()` does the right thing: + +```{r} +y <- numeric(0) +seq_along(y) +1:length(y) +``` + +Lets go back to our original motivation: + +```{r} +df$a <- rescale01(df$a) +df$b <- rescale01(df$b) +df$c <- rescale01(df$c) +df$d <- rescale01(df$d) +``` + +In this case the output is already present: we're modifying an existing object. + +Need to think about a data frame as a list of column (we'll make this definition precise later on). The length of a data frame is the number of columns. To extract a single column, you use `[[`. + +That makes our for loop quite simple: + +```{r} +for (i in seq_along(df)) { + df[[i]] <- rescale01(df[[i]]) +} +``` + +For loops are not as important in R as they are in other languages as rather than writing your own for loops, you'll typically use prewritten functions that wrap up common for-loop patterns. You'll learn about those in the next chapter. These functions are important because they wrap up the book-keeping code related to the for loop, focussing purely on what's happening. For example the two for-loops we wrote above can be rewritten as: + +```{r} +library(purrr) + +map_dbl(df, median) +df[] <- map(df, rescale01) +``` + +The focus is now on the function doing the modification, rather than the apparatus of the for-loop. + +### Looping patterns + +There are three basic ways to loop over a vector: + +1. Loop over the elements: `for (x in xs)`. Most useful for side-effects, + but it's difficult to save the output efficiently. + +1. Loop over the numeric indices: `for (i in seq_along(xs))`. Most common + form if you want to know the element (`xs[[i]]`) and it's position. + +1. Loop over the names: `for (nm in names(xs))`. Gives you both the name + and the position. This is useful if you want to use the name in a + plot title or a file name. + +The most general form uses `seq_along(xs)`, because from the position you can access both the name and the value: + +```{r, eval = FALSE} +for (i in seq_along(x)) { + name <- names(x)[[i]] + value <- x[[i]] +} +``` + +### Exercises + +1. It's common to see for loops that don't preallocate the output and instead + increase the length of a vector at each step: + + ```{r} + results <- vector("integer", 0) + for (i in seq_along(x)) { + results <- c(results, lengths(x[[i]])) + } + results + ``` + + How does this affect performance? + +## Learning more + +As you become a better R programmer, you'll learn more techniques for reducing various types of duplication. This allows you to do more with less, and allows you to express yourself more clearly by taking advantage of powerful programming constructs. + +To learn more you need to study R as a programming language, not just an interactive environment for data science. We have written two books that will help you do so: + +* [Hands on programming with R](http://shop.oreilly.com/product/0636920028574.do), + by Garrett Grolemund. This is an introduction to R as a programming language + and is a great place to start if R is your first programming language. + +* [Advanced R](http://adv-r.had.co.nz) by Hadley Wickham. This dives into the + details of R the programming language. This is a great place to start if + you've programmed in other languages and you want to learn what makes R + special, different, and particularly well suited to data analysis. diff --git a/lists.Rmd b/lists.Rmd index cfa0efa..27f7d04 100644 --- a/lists.Rmd +++ b/lists.Rmd @@ -189,67 +189,41 @@ for (i in seq_along(x)) { results ``` -There are three parts to a for loop: - -1. The __results__: `results <- vector("integer", length(x))`. - This creates an integer vector the same length as the input. It's important - to enough space for all the results up front, otherwise you have to grow the - results vector at each iteration, which is very slow for large loops. - -1. The __sequence__: `i in seq_along(x)`. This determines what to loop over: - each run of the for loop will assign `i` to a different value from - `seq_along(x)`, shorthand for `1:length(x)`. It's useful to think of `i` - as a pronoun. - -1. The __body__: `results[i] <- length(x[[i]])`. This code is run repeatedly, - each time with a different value in `i`. The first iteration will run - `results[1] <- length(x[[1]])`, the second `results[2] <- length(x[[2]])`, - and so on. - -This loop used a function you might not be familiar with: `seq_along()`. This is a safe version of the more familiar `1:length(l)`. There's one important difference in behaviour. If you have a zero-length vector, `seq_along()` does the right thing: +If you do this a lot, you should probably make a function for it: ```{r} -y <- numeric(0) -seq_along(y) -1:length(y) +col_medians <- function(df) { + out <- vector("numeric", ncol(df)) + for (i in 1:ncol(df)) { + out[i] <- median(df[[i]]) + } + out +} +col_medians(df) ``` -Figuring out the length of the elements of a list is a common operation, so it makes sense to turn it into a function so we can reuse it again and again: +Now imagine that you also want to compute the interquartile range of each column? How would you change the function? What if you also wanted to calculate the min and max? ```{r} -compute_length <- function(x) { - results <- vector("numeric", length(x)) - for (i in seq_along(x)) { - results[i] <- length(x[[i]]) +col_min <- function(df) { + out <- vector("numeric", ncol(df)) + for (i in 1:ncol(df)) { + out[i] <- min(df[[i]]) } - results + out +} +col_max <- function(df) { + out <- vector("numeric", ncol(df)) + for (i in 1:ncol(df)) { + out[i] <- max(df[[i]]) + } + out } -compute_length(x) ``` -(In fact base R has this function already: it's called `lengths()`.) +I've now copied-and-pasted this function three times, so it's time to think about how to generalise it. If you look at these functions, you'll notice that they are very similar: the only difference is the function that gets called. -Now imagine we want to compute the `mean()` of each element. How would our function change? What if we wanted to compute the `median()`? You could create variations of `compute_lengths()` that looked like this: - -```{r} -compute_mean <- function(x) { - results <- vector("numeric", length(x)) - for (i in seq_along(x)) { - results[i] <- mean(x[[i]]) - } - results -} -compute_mean(x) - -compute_median <- function(x) { - results <- vector("numeric", length(x)) - for (i in seq_along(x)) { - results[i] <- median(x[[i]]) - } - results -} -compute_median(x) -``` +I mentioned earlier that R is a functional programming language. Practically, what this means is that you can not only pass vectors and data frames to functions, but you can also pass other functions. So you can generalise these `col_*` functions by adding an additional argument: But this is only two of the many functions we might want to apply to every element of a list, and there's already lot of duplication. Most of the code is for-loop boilerplate and it's hard to see the one function (`length()`, `mean()`, or `median()`) that's actually important. @@ -269,16 +243,32 @@ f <- function(x, i) abs(x - mean(x)) ^ i You've reduce the chance of bugs (because you now have 1/3 less code), and made it easy to generalise to new situations. We can do exactly the same thing with `compute_length()`, `compute_median()` and `compute_mean()`: +I mentioned earlier that R is a functional programming language. Practically, what this means is that you can not only pass vectors and data frames to functions, but you can also pass other functions. So you can generalise these `col_*` functions by adding an additional argument: + ```{r} -compute_summary <- function(x, f) { - results <- vector("numeric", length(x)) - for (i in seq_along(x)) { - results[i] <- f(x[[i]]) +col_summary <- function(df, fun) { + out <- vector("numeric", ncol(df)) + for (i in 1:ncol(df)) { + out[i] <- fun(df[[i]]) } - results + out } -compute_summary(x, mean) -``` +col_summary(df, median) +col_summary(df, min) +``` + +We can take this one step further and use another cool feature of R functions: "`...`". "`...`" just takes any additional arguments and allows you to pass them on to another function: + +```{r} +col_summary <- function(df, fun, ...) { + out <- vector("numeric", ncol(df)) + for (i in 1:ncol(df)) { + out[i] <- fun(df[[i]], ...) + } + out +} +col_summary(df, median, na.rm = TRUE) +``` Instead of hardcoding the summary function, we allow it to vary, by adding an additional argument that is a function. It can take a while to wrap your head around this, but it's very powerful technique. This is one of the reasons that R is known as a "functional" programming language. @@ -286,19 +276,10 @@ Instead of hardcoding the summary function, we allow it to vary, by adding an ad 1. Read the documentation for `apply()`. In the 2d case, what two for loops does it generalise? - -1. It's common to see for loops that don't preallocate the output and instead - increase the length of a vector at each step: - - ```{r} - results <- vector("integer", 0) - for (i in seq_along(x)) { - results <- c(results, lengths(x[[i]])) - } - results - ``` - - How does this affect performance? + +1. Adapt `col_summary()` so that it only applies to numeric columns + You might want to start with an `is_numeric()` function that returns + a logical vector that has a TRUE corresponding to each numeric column. ## The map functions From af8f81c28cfb877eb86f1164ab7e3168556284b2 Mon Sep 17 00:00:00 2001 From: Brandon Greenwell Date: Fri, 22 Jan 2016 08:50:37 -0500 Subject: [PATCH 004/104] Fix typo Missing a word (e.g., over or of) here. --- strings.Rmd | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/strings.Rmd b/strings.Rmd index 09e3a7b..991cbfc 100644 --- a/strings.Rmd +++ b/strings.Rmd @@ -330,7 +330,7 @@ str_view(c("grey", "gray"), "gr(e|a)y") ### Repetition -The next step up in power involves control how many times a pattern matches: +The next step up in power involves control over how many times a pattern matches: * `?`: 0 or 1 * `+`: 1 or more From 986ea6145301b03cbcac03995b9b76b1c37a2cb1 Mon Sep 17 00:00:00 2001 From: hadley Date: Fri, 22 Jan 2016 08:55:08 -0600 Subject: [PATCH 005/104] Pipes rewrite --- functions.Rmd | 233 +++++++++++++++++++++++++------------------------- 1 file changed, 118 insertions(+), 115 deletions(-) diff --git a/functions.Rmd b/functions.Rmd index ec668fc..e29ad4c 100644 --- a/functions.Rmd +++ b/functions.Rmd @@ -6,10 +6,13 @@ title: Expressing yourself in code # Expressing yourself in code ```{r, include = FALSE} +source("common.R") knitr::opts_chunk$set( cache = TRUE, fig.path = "figures/functions/" ) +library(dplyr) +diamonds <- ggplot2::diamonds ``` Code is a tool of communication, not just to the computer, but to other people. This is important because every project you undertake is fundamentally collaborative. Even if you're not working with other people, you'll definitely be working with future-you. You want to write clear code so that future-you doesn't curse present-you when you look at a project again after several months have passed. @@ -37,132 +40,140 @@ Writing code is similar in many ways to writing prose. One parallel which I find ## Piping -Let's use code to tell a story about a little bunny named foo foo: +### Piping alternatives -> Little bunny Foo Foo -> Went hopping through the forest -> Scooping up the field mice -> And bopping them on the head +To explore how you can write the same code in many different ways, let's use code to tell a story about a little bunny named foo foo: + +> Little bunny Foo Foo +> Went hopping through the forest +> Scooping up the field mice +> And bopping them on the head We'll start by defining an object to represent litte bunny Foo Foo: -```R +```{r, eval = FALSE} foo_foo <- little_bunny() ``` -And then we'll use a function for each key verb. There are a number of ways we could use functions to tell this story: +And then we'll use a function for each key verb `hop()`, `scoop()`, and `bop()`. Using this object and these verbs, there are a number of ways we could retell the story in code: -* Save each step as a new object +* Save each intermediate step as a new object +* Rewrite the original object multiple times +* Compose functions +* Use the pipe -### Intermediate steps +Below we work through each approach, showing you the code and talking about the advantages and disadvantages. -```R -foo_foo_1 <- hop_through(foo_foo, forest) -foo_foo_2 <- scoop_up(foo_foo_1, field_mice) -foo_foo_3 <- bop_on(foo_foo_2, head) +#### Intermediate steps + +The simplest and most robust approach to sequencing multiple function calls is to save each intermediary as a new object: + +```{r, eval = FALSE} +foo_foo_1 <- hop(foo_foo, through = forest) +foo_foo_2 <- scoop(foo_foo_1, up = field_mice) +foo_foo_3 <- bop(foo_foo_2, on = head) ``` -This avoids the nesting, but you now have to name each intermediate element. -If there are natural names, use this form. But if you're just numbering -them, I don't think it's that useful. Whenever I write code like this, -I invariably write the wrong number somewhere and then spend 10 minutes -scratching my head and trying to figure out what went wrong with my code. +The main downside of this form is that it forces you to name each intermediate element. If there are natural names, this form feels natural, and you should use it. But if you're giving then arbitrary unique names, like this example, I don't think it's that useful. Whenever I write code like this, I invariably write the wrong number somewhere and then spend 10 minutes scratching my head and trying to figure out what went wrong with my code. -You may also worry that this form creates many intermediate copies of your -data and takes up a lot of memory. First, in R, I don't think worrying about -memory is a useful way to spend your time: worry about it when it becomes -a problem (i.e. you run out of memory), not before. Second, R isn't stupid: -it will reuse the shared columns in a pipeline of data frame transformations. +You may worry that this form creates many intermediate copies of your data and takes up a lot of memory. First, in R, I don't think worrying about memory is a useful way to spend your time: worry about it when it becomes a problem (i.e. you run out of memory), not before. Second, R isn't stupid: it will reuse the shared columns in a pipeline of data frame transformations. Let's take a look at an actual data manipulation pipeline where we add a new column to the `diamonds` dataset from ggplot2: -You can see that using `pryr::object_size()` (unfortunately the built-in -`object.size()` doesn't have quite enough smarts to show you this super -important feature of R): +```{r} +diamonds2 <- mutate(diamonds, price_per_carat = price / carat) -```{R} -diamonds <- ggplot2::diamonds -pryr::object_size(diamonds) - -diamonds2 <- dplyr::mutate(diamonds, price_per_carat = price / carat) -pryr::object_size(diamonds2) - -pryr::object_size(diamonds, diamonds2) +library(pryr) +object_size(diamonds) +object_size(diamonds2) +object_size(diamonds, diamonds2) ``` -`diamonds` is 3.46 MB, and `diamonds2` is 3.89 MB, but the total size of -`diamonds` and `diamonds2` is only 3.89 MB. How does that work? -only 3.89 MB +`pryr::object_size()` gives the memory occupied by all of its arguments. The results seem counterintuitive at first: -### Overwrite the original +* `diamonds` takes up 3.46 MB, +* `diamonds2` takes up 3.89 MB, +* `diamonds` and `diamonds2` together take up 3.89 MB! -```R -foo_foo <- hop_through(foo_foo, forest) -foo_foo <- scoop_up(foo_foo, field_mice) -foo_foo <- bop_on(foo_foo, head) +How can that work? Well, `diamonds2` has 10 columns in common with `diamonds`: there's no need to duplicate all that data so both data frames share the vectors. R will only create a copy of a vector if you modify it. Modifying a single value will mean that the data frames can no longer share as much memory. The individual sizes will be unchange, but the collective size will increase: + +```{r} +diamonds$carat[1] <- NA +object_size(diamonds) +object_size(diamonds2) +object_size(diamonds, diamonds2) ``` -This is a minor variation of the previous form, where instead of giving -each intermediate element its own name, you use the same name, replacing -the previous value at each step. This is less typing (and less thinking), -so you're less likely to make mistakes. However, it can make debugging -painful, because if you make a mistake you'll need to start from -scratch again. Also, I think the reptition of the object being transformed -(here we've repeated `foo_foo` six times!) obscures the intent of the code. +(Note that we use `pryr::object_size()` here, not the built-in `object.size()`, because it doesn't have quite enough smarts.) -### Function composition +#### Overwrite the original -```R -bop_on( - scoop_up( - hop_through(foo_foo, forest), - field_mice +One way to eliminate all of the intermediate objects is to just overwrite the input: + +```{r, eval = FALSE} +foo_foo <- hop(foo_foo, through = forest) +foo_foo <- scoop(foo_foo, up = field_mice) +foo_foo <- bop(foo_foo, on = head) +``` + +This is a minor variation of the previous form, where instead of giving each intermediate element its own name, you use the same name, replacing the previous value at each step. This is less typing (and less thinking), so you're less likely to make mistakes. However, it will make debugging painful: if you make a mistake you'll need to start again from scratch. Also, I think the reptition of the object being transformed (here we've written `foo_foo` six times!) obscures what's changing on each line. + +#### Function composition + +Another approach is to abandon assignment altogether and just string the function calls together: + +```{r, eval = FALSE} +bop( + scoop( + hop(foo_foo, through = forest), + up = field_mice ), - head + on = head ) ``` -The disadvantage is that you have to read from inside-out, from -right-to-left, and that the arguments end up spread far apart -(sometimes called the -[dagwood sandwhich](https://en.wikipedia.org/wiki/Dagwood_sandwich) -problem). +Here the disadvantage is that you have to read from inside-out, from right-to-left, and that the arguments end up spread far apart (sometimes called the +[dagwood sandwhich](https://en.wikipedia.org/wiki/Dagwood_sandwich) problem). -### Use the pipe +#### Use the pipe -```R +Finally, we can use the pipe: + +```{r, eval = FALSE} foo_foo %>% - hop_through(forest) %>% - scoop_up(field_mouse) %>% - bop_on(head) + hop(through = forest) %>% + scoop(up = field_mouse) %>% + bop(on = head) ``` -This is my favourite form. The downside is that you need to understand -what the pipe does, but once you've mastered that simple task, you can -read this series of function compositions like it's a set of imperative -actions. +This is my favourite form. The downside is that you need to understand what the pipe does, but once you've mastered that idea task, you can read this series of function compositions like it's a set of imperative actions. Foo foo, hops, then scoops, then bops. Behind the scenes magrittr converts this to: ```{r, eval = FALSE} -. <- hop_through(foo_foo, forest) -. <- scoop_up(., field_mice) -bop_on(., head) +. <- hop(foo_foo, through = forest) +. <- scoop(., up = field_mice) +bop(., on = head) ``` -using `.` as the name of the object. This makes it easier to debug than -the first form because it avoids deeply nested fuction calls.) -### Useful intermediates +It's useful to know this because if an error is throw in the middle of the pipe, you'll need to be able to interpret the `traceback()`. -* Whenever you write your own function that is used primarily for its - side-effects, you should always return the first argument invisibly, e.g. - `invisible(x)`: that way it can easily be used in a pipe. +### Other piping tools - If a function doesn't follow this contract (e.g. `plot()` which returns - `NULL`), you can still use it with magrittr by using the "tee" operator. - `%T>%` works like `%>%` except instead it returns the LHS instead of the - RHS: +The pipe is provided by the magrittr package, by Stefan Milton Bache. Most of packages you work in this book automatically provide `%>%` for you. You might want to load magrittr yourself if you're using another package, or you want to access some of the other pipe variants that magrittr provides. + +```{r} +library(magrittr) +``` + +* When working with more complex pipes, it's some times useful to call a + function for its side-effects. Maybe you want to print out the current + object, or plot it, or save it to disk. Many times, such functions don't + return anything, effectively terminating the pipe. + + To work around this problem, you can use the "tee" pipe. `%T>%` works like + `%>%` except instead it returns the LHS instead of the RHS. It's called + "tee" because it's like a literal T-shaped pipe. ```{r} - library(magrittr) rnorm(100) %>% matrix(ncol = 2) %>% plot() %>% @@ -174,15 +185,6 @@ the first form because it avoids deeply nested fuction calls.) str() ``` -* When you run a pipe interactively, it's easy to see if something - goes wrong. When you start writing pipes that are used in production, i.e. - they're run automatically and a human doesn't immediately look at the output - it's a really good idea to include some assertions that verify the data - looks like expect. One great way to do this is the ensurer package, - writen by Stefan Milton Bache (the author of magrittr). - - - * If you're working with functions that don't have a dataframe based API (i.e. you pass them individual vectors, not a data frame and expressions to be evaluated in the context of that data frame), you might find `%$%` @@ -195,23 +197,6 @@ the first form because it avoids deeply nested fuction calls.) cor(disp, mpg) ``` -### When not to use the pipe - -The pipe is a powerful tool, but it's not the only tool at your disposal, and it doesn't solve every problem! Generally, you should reach for another tool when: - -* Your pipes get longer than five or six lines. It's a good idea to create - intermediate objects with meaningful names. That helps with debugging, - because it's easier to figure out when things went wrong. It also helps - understand the problem, because a good name can be very evocative of the - purpose. - -* You have multiple inputs or outputs. - -* Instead of creating a linear pipeline where you're primarily transforming - one object, you're starting to create a directed graphs with a complex - dependency structure. Pipes are fundamentally linear and expressing - complex relationships with them does not often yield clear code. - * For assignment. magrittr provides the `%<>%` operator which allows you to replace code like: @@ -230,11 +215,29 @@ The pipe is a powerful tool, but it's not the only tool at your disposal, and it In my opinion, a little bit of duplication (i.e. repeating the name of the object twice), is fine in return for making assignment more explicit. - - I think it also gives you a better mental model of how assignment works - in R. The above code does not modify `mtcars`: it instead creates a - modified copy and then replaces the old version (this may seem like a - subtle point but I think it's quite important). + +### When not to use the pipe + +The pipe is a powerful tool, but it's not the only tool at your disposal, and it doesn't solve every problem! Pipes are most useful for rewriting a fairly short linear sequence of operations. I think you should reach for another tool when: + +* Your pipes get longer than five or six lines. In that case, create + intermediate objects with meaningful names. That will make debugging easier, + because you can more easily check the intermediate results. It also helps + when reading the code, because the variable names can help describe the + intent of the code. + +* You have multiple inputs or outputs. If there is not one primary object + being transformed, write code the regular ways. + +* You are start to think about a directed graph with a complex + dependency structure. Pipes are fundamentally linear and expressing + complex relationships with them typically does not yield clear code. + +### Pipes in production + +When you run a pipe interactively, it's easy to see if something goes wrong. When you start writing pipes that are used in production, i.e. they're run automatically and a human doesn't immediately look at the output it's a really good idea to include some assertions that verify the data looks like expect. One great way to do this is the ensurer package, writen by Stefan Milton Bache (the author of magrittr). + + ## Functions From 5e8d9523136abecda146a6388969aeac9cfb7a58 Mon Sep 17 00:00:00 2001 From: hadley Date: Fri, 22 Jan 2016 10:03:10 -0600 Subject: [PATCH 006/104] Fix broken example post move-around --- lists.Rmd | 1 + 1 file changed, 1 insertion(+) diff --git a/lists.Rmd b/lists.Rmd index 27f7d04..258f594 100644 --- a/lists.Rmd +++ b/lists.Rmd @@ -192,6 +192,7 @@ results If you do this a lot, you should probably make a function for it: ```{r} +df <- data.frame(x = 1:10, y = rnorm(100)) col_medians <- function(df) { out <- vector("numeric", ncol(df)) for (i in 1:ncol(df)) { From 81017536509ead0ebc3b444e49ebda6990a723d4 Mon Sep 17 00:00:00 2001 From: hadley Date: Mon, 25 Jan 2016 08:59:36 -0600 Subject: [PATCH 007/104] More functions and for loops --- functions.Rmd | 119 +++++++++++++++++++++++++++++++++++++++++--------- lists.Rmd | 101 +++++++++++++++++------------------------- 2 files changed, 140 insertions(+), 80 deletions(-) diff --git a/functions.Rmd b/functions.Rmd index e29ad4c..80f2498 100644 --- a/functions.Rmd +++ b/functions.Rmd @@ -34,12 +34,14 @@ To me, improving your communication skills is a key part of mastering R as a pro common patterns of for loops and put them in a function. We'll come back to that idea in XYZ. -Removing duplication is an important part of expressing yourself clearly because it lets the reader focus on what's different between operations rather than what's the same. The goal is not just to write better funtions or to do things that you couldn't do before, but to code with more "ease". As you internalise the ideas in this chapter, you should find it easier to re-tackle problems that you've solved in the past with much effort. +Removing duplication is an important part of expressing yourself clearly because it lets the reader (i.e. future-you!) focus on what's different between operations rather than what's the same. The goal is not just to write better funtions or to do things that you couldn't do before, but to code with more "ease". As you internalise the ideas in this chapter, you should find it easier to re-tackle problems that you've solved in the past with much effort. Writing code is similar in many ways to writing prose. One parallel which I find particularly useful is that in both cases rewriting is key to clarity. The first expression of your ideas is unlikely to be particularly clear, and you may need to rewrite multiple times. After solving a data analysis challenge, it's often worth looking at your code and thinking about whether or not it's obvious what you've done. If you spend a little time rewriting your code while the ideas are fresh, you can save a lot of time later trying to recreate what your code did. But this doesn't mean you should rewrite every function: you need to balance what you need to achieve now with saving time in the long run. (But the more you rewrite your functions the more likely you'll first attempt will be clear.) ## Piping +Pipes let you transform the way you call deeply nested functions. Using a pipe doesn't affect at all what the code does; behind the scenes it is run in exactly the same way. What the pipe does is change how the code is written and hence how it is read. It tends to transform to a more imperative form (do this, do that, do that other thing, ...) so that it's easier to read. + ### Piping alternatives To explore how you can write the same code in many different ways, let's use code to tell a story about a little bunny named foo foo: @@ -76,7 +78,7 @@ foo_foo_3 <- bop(foo_foo_2, on = head) The main downside of this form is that it forces you to name each intermediate element. If there are natural names, this form feels natural, and you should use it. But if you're giving then arbitrary unique names, like this example, I don't think it's that useful. Whenever I write code like this, I invariably write the wrong number somewhere and then spend 10 minutes scratching my head and trying to figure out what went wrong with my code. -You may worry that this form creates many intermediate copies of your data and takes up a lot of memory. First, in R, I don't think worrying about memory is a useful way to spend your time: worry about it when it becomes a problem (i.e. you run out of memory), not before. Second, R isn't stupid: it will reuse the shared columns in a pipeline of data frame transformations. Let's take a look at an actual data manipulation pipeline where we add a new column to the `diamonds` dataset from ggplot2: +You may worry that this form creates many intermediate copies of your data and takes up a lot of memory. First, in R, worrying about memory is not a useful way to spend your time: worry about it when it becomes a problem (i.e. you run out of memory), not before. Second, R isn't stupid: it will reuse the shared columns in a pipeline of data frame transformations. Let's take a look at an actual data manipulation pipeline where we add a new column to the `diamonds` dataset from ggplot2: ```{r} diamonds2 <- mutate(diamonds, price_per_carat = price / carat) @@ -106,7 +108,7 @@ object_size(diamonds, diamonds2) #### Overwrite the original -One way to eliminate all of the intermediate objects is to just overwrite the input: +One way to eliminate the intermediate objects is to just overwrite the same object again and again: ```{r, eval = FALSE} foo_foo <- hop(foo_foo, through = forest) @@ -114,8 +116,14 @@ foo_foo <- scoop(foo_foo, up = field_mice) foo_foo <- bop(foo_foo, on = head) ``` -This is a minor variation of the previous form, where instead of giving each intermediate element its own name, you use the same name, replacing the previous value at each step. This is less typing (and less thinking), so you're less likely to make mistakes. However, it will make debugging painful: if you make a mistake you'll need to start again from scratch. Also, I think the reptition of the object being transformed (here we've written `foo_foo` six times!) obscures what's changing on each line. +This is less typing (and less thinking), so you're less likely to make mistakes. However, there are two problems: +1. It will make debugging painful: if you make a mistake you'll need to start + again from scratch. + +1. The reptition of the object being transformed (we've written `foo_foo` six + times!) obscures what's changing on each line. + #### Function composition Another approach is to abandon assignment altogether and just string the function calls together: @@ -154,9 +162,9 @@ Behind the scenes magrittr converts this to: bop(., on = head) ``` -It's useful to know this because if an error is throw in the middle of the pipe, you'll need to be able to interpret the `traceback()`. +It's useful to know this because if an error is thrown in the middle of the pipe, you'll need to be able to interpret the `traceback()`. -### Other piping tools +### Other tools from magrittr The pipe is provided by the magrittr package, by Stefan Milton Bache. Most of packages you work in this book automatically provide `%>%` for you. You might want to load magrittr yourself if you're using another package, or you want to access some of the other pipe variants that magrittr provides. @@ -261,7 +269,7 @@ df$d <- (df$d - min(df$d, na.rm = TRUE)) / (max(df$d, na.rm = TRUE) - min(df$d, na.rm = TRUE)) ``` -You might be able to puzzle out that this rescales each column to 0--1. Did you spot the mistake? I made an error when updating the code for `df$b`, and I forgot to change an `a` to a `b`. Extracting repeated code out into a function is a good idea because it helps make your code more understandable (because you can name the operation), and it prevents you from making this sort of update error. +You might be able to puzzle out that this rescales each column to 0--1. But did you spot the mistake? I made an error when updating the code for `df$b`, and I forgot to change an `a` to a `b`. Extracting repeated code out into a function is a good idea because it helps make your code more understandable (because you can name the operation), and it prevents you from making this sort of copy-and-paste error. To write a function you need to first analyse the operation. How many inputs does it have? @@ -277,7 +285,7 @@ x <- 1:10 (x - min(x, na.rm = TRUE)) / (max(x, na.rm = TRUE) - min(x, na.rm = TRUE)) ``` -We can also see some duplication in this code: I'm computing the `min()` and `max()` multiple times, and I could instead do that in one step: +There is some duplication in this code: I'm computing the `min()` and `max()` multiple times, and I could instead do that in one step: ```{r} rng <- range(x, na.rm = TRUE) @@ -294,14 +302,9 @@ rescale01 <- function(x) { rescale01(c(0, 5, 10)) ``` -The result returned from a function is the last thing is does. - Always make sure your code works on a simple test case before creating the function! -Always want to start simple: start with test values and get the body of the function working first. -Check each step as you go. -Don’t try and do too much at once! -“Wrap it up” as a function only once everything works. +Note the process that I followed here: constructing the `function` is the last thing I did. It's much easier to start with code that works on a sample input and then turn it into a function rather than the other way around. You're more likely to get to your final destination if you take small steps and check your work after each step. Now we can use that to simplify our original example: @@ -312,17 +315,93 @@ df$c <- rescale01(df$c) df$d <- rescale01(df$d) ``` -This makes it more clear what we're doing, and avoids one class of copy-and-paste errors. However, we still have quite a bit of duplication: we're doing the same thing to each column. We'll learn how to handle that in the for loop section. But first, lets talk a bit more about functions. +This makes it more clear what we're doing, and avoids one class of copy-and-paste errors. However, we still have quite a bit of duplication: we're still doing the same thing to multiple columns. We'll learn how to handle that in the for loop section. But first, lets talk a bit more about functions. + +### Practice + +Practice turning the following code snippets into functions. Think about how you can re-write them to be as clear an expressive as possible. ### Function components -* Arguments (incl. default) -* Body -* Environment +There are three attributes that define what a function does: -### Scoping +1. The __arguments__ of a function are its inputs. -### `...` +1. The __body__ of a function is the code that it runs each time. + +1. The function __environment__ controls how it looks up values from names + (i.e. how it goes from the name `x`, to its value, `10`). + +#### Arguments + +You can choose to supply default values to your arguments for common options. This is useful so that you don't need to repeat yourself all the time. + +```{r} +foo <- function(x = 1, y = TRUE, z = 10:1) { + +} +``` + +Default values can depend on other arguments but don't over use this technique as it's possible to create code that is very difficult to understand: + +```{r} +bar <- function(x = y + 1, y = x + 1) { + x * y +} +``` + +On other aspect of arguments you'll commonly see is `...`. This captures any other arguments not otherwise matched. It's useful because you can then send those `...` on to another argument. This is a useful catch all if your function primarily wraps another function. For example, you might have written your own wrapper designed to add linear model lines to a ggplot: + +```{r} +geom_lm <- function(formula = y ~ x, colour = alpha("steelblue", 0.5), + size = 2, ...) { + geom_smooth(formula = formula, se = FALSE, method = "lm", colour = colour, + size = size, ...) +} +``` + +This allows you to use any other arguments of `geom_smooth()`, even thoses that aren't explicitly listed in your wrapper (and even arguments that don't exist yet in the version of ggplot2 that you're using). + +#### Body + +The body of the function does the actual work. The return value of a function is the last thing that it does. + +You can use an explicit `return()` statement, but this is not needed, and is best avoided except when you want to return early. + +#### Environment + +The environment of a function control where values are looked up from. Take this function for example: + +```{r} +f <- function(x) { + x + y +} +``` + +In many programming languages, this would be an error, because `y` is not defined inside the function. However, in R this is valid code. Since `y` is not defined inside the function, R will look in the environment where the function was defined: + +```{r} +y <- 100 +f(10) + +y <- 1000 +f(10) +``` + +You should avoid functions that work like this because it makes it harder to predict what your function will return. + +This behaviour seems like a recipe for bugs, but by and large it doesn't cause too many, especially as you become a more experienced R programmer. The advantage of this behaviour is from a language stand point it allows R to be very consistent. Every name is looked up using the same set of rules. For `f()` that includes the behaviour of two things that you might not expect: `{` and `+`. + +This consistent set of rules allows for a number of powerful tool that are unfortunately beyond the scope of this book, but you can read about in "Advanced R". + +#### Exercises + +1. What happens if you try to override the method in `geom_lm()` created + above? Why? + +### Making functions with magrittr + +One cool feature of the pipe is that it's also very easy to create functions with it. ### Non-standard evaluation diff --git a/lists.Rmd b/lists.Rmd index 258f594..d5472f9 100644 --- a/lists.Rmd +++ b/lists.Rmd @@ -170,63 +170,59 @@ knitr::include_graphics("images/pepper-3.jpg") 1. What happens if you subset a data frame as if you're subsetting a list? What are the key differences between a list and a data frame? -## For loops +## For loops vs functionals -To illustrate for loops, we'll start by creating a stereotypical list: an eight element list where each element contains a random vector of random length. (You'll learn about `rerun()` later.) +Imagine you have a data frame and you want to compute the mean of each column. You might write code like this: ```{r} -x <- rerun(8, runif(sample(5, 1))) -str(x) -``` +df <- data.frame( + a = rnorm(10), + b = rnorm(10), + c = rnorm(10), + d = rnorm(10) +) -Imagine we want to compute the length of each element in this list. One way to do that is with a for loop: - -```{r} -results <- vector("integer", length(x)) -for (i in seq_along(x)) { - results[i] <- length(x[[i]]) +results <- numeric(length(df)) +for (i in seq_along(df)) { + results[i] <- mean(df[[i]]) } results ``` -If you do this a lot, you should probably make a function for it: +(Here we're taking advantage of the fact that a data frame is a list of the individual columns, so `length()` and `seq_along()` are useful.) + +You realise that you're going to want to compute the means of every column pretty frequently, so you extract it out into a function: ```{r} -df <- data.frame(x = 1:10, y = rnorm(100)) -col_medians <- function(df) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- median(df[[i]]) +col_mean <- function(df) { + results <- numeric(length(df)) + for (i in seq_along(df)) { + results[i] <- mean(df[[i]]) } - out -} -col_medians(df) -``` - -Now imagine that you also want to compute the interquartile range of each column? How would you change the function? What if you also wanted to calculate the min and max? - -```{r} -col_min <- function(df) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- min(df[[i]]) - } - out -} -col_max <- function(df) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- max(df[[i]]) - } - out + results } ``` -I've now copied-and-pasted this function three times, so it's time to think about how to generalise it. If you look at these functions, you'll notice that they are very similar: the only difference is the function that gets called. +But then you think it'd also be helpful to be able to compute the median or the standard deviation: -I mentioned earlier that R is a functional programming language. Practically, what this means is that you can not only pass vectors and data frames to functions, but you can also pass other functions. So you can generalise these `col_*` functions by adding an additional argument: +```{r} +col_median <- function(df) { + results <- numeric(length(df)) + for (i in seq_along(df)) { + results[i] <- median(df[[i]]) + } + results +} +col_sd <- function(df) { + results <- numeric(length(df)) + for (i in seq_along(df)) { + results[i] <- sd(df[[i]]) + } + results +} +``` -But this is only two of the many functions we might want to apply to every element of a list, and there's already lot of duplication. Most of the code is for-loop boilerplate and it's hard to see the one function (`length()`, `mean()`, or `median()`) that's actually important. +I've now copied-and-pasted this function three times, so it's time to think about how to generalise it. Most of the code is for-loop boilerplate and it's hard to see the one piece (`mean()`, `median()`, `sd()`) that differs. What would you do if you saw a set of functions like this: @@ -242,14 +238,12 @@ Hopefully, you'd notice that there's a lot of duplication, and extract it out in f <- function(x, i) abs(x - mean(x)) ^ i ``` -You've reduce the chance of bugs (because you now have 1/3 less code), and made it easy to generalise to new situations. We can do exactly the same thing with `compute_length()`, `compute_median()` and `compute_mean()`: - -I mentioned earlier that R is a functional programming language. Practically, what this means is that you can not only pass vectors and data frames to functions, but you can also pass other functions. So you can generalise these `col_*` functions by adding an additional argument: +You've reduce the chance of bugs (because you now have 1/3 less code), and made it easy to generalise to new situations. We can do exactly the same thing with `col_mean()`, `col_median()` and `col_sd()`, by adding an argument that contains the function to apply to each column: ```{r} col_summary <- function(df, fun) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { + out <- vector("numeric", length(df)) + for (i in seq_along(df)) { out[i] <- fun(df[[i]]) } out @@ -258,20 +252,7 @@ col_summary(df, median) col_summary(df, min) ``` -We can take this one step further and use another cool feature of R functions: "`...`". "`...`" just takes any additional arguments and allows you to pass them on to another function: - -```{r} -col_summary <- function(df, fun, ...) { - out <- vector("numeric", ncol(df)) - for (i in 1:ncol(df)) { - out[i] <- fun(df[[i]], ...) - } - out -} -col_summary(df, median, na.rm = TRUE) -``` - -Instead of hardcoding the summary function, we allow it to vary, by adding an additional argument that is a function. It can take a while to wrap your head around this, but it's very powerful technique. This is one of the reasons that R is known as a "functional" programming language. +The idea of using a function as an argument to another function is extremely powerful. It might take you a while to wrap your head around it, but it's worth the investment. In the rest of the chapter, you'll learn about and use the purrr package which provides a set of functions that eliminate the need for for-loops for many comon scenarios. ### Exercises From de44f2e3d6ed50bae92a5ff80c4e38399576a9f9 Mon Sep 17 00:00:00 2001 From: Radu Grosu Date: Wed, 27 Jan 2016 13:33:35 +0000 Subject: [PATCH 008/104] Update import.Rmd typos --- import.Rmd | 146 ++++++++++++++++++++++++++--------------------------- 1 file changed, 73 insertions(+), 73 deletions(-) diff --git a/import.Rmd b/import.Rmd index 518ec6f..da6a6f6 100644 --- a/import.Rmd +++ b/import.Rmd @@ -27,14 +27,14 @@ There are many ways to read flat files into R. If you've be using R for a while, * These functions are typically much faster (~10x) than the base equivalents. Long run running jobs also have a progress bar, so you can see what's - happening. (If you're looking for raw speed, try `data.table::fread()`, + happening. (If you're looking for raw speed, try `data.table::fread()`, it's slightly less flexible than readr, but can be twice as fast.) - + * They have more flexible parsers: they can read in dates, times, currencies, - percentages, and more. - -* They fail to do some annoying things like converting character vectors to - factors, munging the column headers to make sure they're valid R + percentages, and more. + +* They fail to do some annoying things like converting character vectors to + factors, munging the column headers to make sure they're valid R variable names, and using row names. * They return objects with class `tbl_df`. As you saw in the dplyr chapter, @@ -45,24 +45,24 @@ There are many ways to read flat files into R. If you've be using R for a while, sometimes need to supply a few more arguments when using them the first time, but they'll definitely work on other peoples computers. The base R functions take a number of settings from system defaults, which means that - code that works on your computer might not work on someone elses. + code that works on your computer might not work on someone else's. Make sure you have the readr package (`install.packages("readr")`). Most of readr's functions are concerned with turning flat files into data frames: -* `read_csv()` read comma delimited files, `read_csv2()` reads semi-colon +* `read_csv()` reads comma delimited files, `read_csv2()` reads semi-colon separated files (common in countries where `,` is used as the decimal place), `read_tsv()` reads tab delimited files, and `read_delim()` reads in files with a user supplied delimiter. * `read_fwf()` reads fixed width files. You can specify fields either by their - widths with `fwf_widths()` or theirs position with `fwf_positions()`. + widths with `fwf_widths()` or their position with `fwf_positions()`. `read_table()` reads a common variation of fixed width files where columns are separated by white space. * `read_log()` reads Apache style logs. (But also check out - [webreadr](https://github.com/Ironholds/webreadr) which is built on top + [webreadr](https://github.com/Ironholds/webreadr) which is built on top of `read_log()`, but provides many more helpful tools.) readr also provides a number of functions for reading files off disk into simpler data structures: @@ -73,29 +73,29 @@ readr also provides a number of functions for reading files off disk into simple These might be useful for other programming tasks. -As well as reading data frame disk, readr also provides tools for working with data frames and character vectors in R: +As well as reading data from disk, readr also provides tools for working with data frames and character vectors in R: * `type_convert()` applies the same parsing heuristics to the character columns in a data frame. You can override its choices using `col_types`. - + For the rest of this chapter we'll focus on `read_csv()`. If you understand how to use this function, it will be straightforward to your knowledge to all the other functions in readr. ### Basics The first two arguments of `read_csv()` are: -* `file`: path (or URL) to the file you want to load. Readr can automatically +* `file`: path (or URL) to the file you want to load. Readr can automatically decompress files ending in `.zip`, `.gz`, `.bz2`, and `.xz`. This can also be a literal csv file, which is useful for experimenting and creating reproducible examples. - + * `col_names`: column names. There are three options: - - * `TRUE` (the default), which reads column names from the first row + + * `TRUE` (the default), which reads column names from the first row of the file - - * `FALSE` number columns sequentially from `X1` to `Xn`. - + + * `FALSE` numbers columns sequentially from `X1` to `Xn`. + * A character vector, used as column names. If these don't match up with the columns in the data, you'll get a warning message. @@ -109,7 +109,7 @@ EXAMPLE Typically, you'll see a lot of warnings if readr has guessed the column type incorrectly. This most often occurs when the first 1000 rows are different to the rest of the data. Perhaps there are a lot of missing data there, or maybe your data is mostly numeric but a few rows have characters. Fortunately, it's easy to fix these problems using the `col_type` argument. -(Note that if you have a very large file, you might want to set `n_max` to 10,000 or 100,000. That will speed up iteration while you're finding common problems) +(Note that if you have a very large file, you might want to set `n_max` to 10,000 or 100,000. That will speed up iterations while you're finding common problems) Specifying the `col_type` looks like this: @@ -122,24 +122,24 @@ read_csv("mypath.csv", col_types = col( You can use the following types of columns -* `col_integer()` (i) and `col_double()` (d) specify integer and doubles. +* `col_integer()` (i) and `col_double()` (d) specify integer and doubles. `col_logical()` (l) parses TRUE, T, FALSE and F into a logical vector. - `col_character()` (c) leaves strings as is. + `col_character()` (c) leaves strings as is. -* `col_number()` (n) is a more flexible parsed for numbers embedded in other - strings. It will look for the first number in a string, ignoring non-numeric - prefixes and suffixes. It will also ignoring the grouping mark specified by +* `col_number()` (n) is a more flexible parsed for numbers embedded in other + strings. It will look for the first number in a string, ignoring non-numeric + prefixes and suffixes. It will also ignore the grouping mark specified by the locale (see below for more details). - -* `col_factor()` (f) allows you to load data directly into a factor if you know + +* `col_factor()` (f) allows you to load data directly into a factor if you know what the levels are. - + * `col_skip()` (_, -) completely ignores a column. -* `col_date()` (D), `col_datetime()` (T) and `col_time()` (t) parse into dates, +* `col_date()` (D), `col_datetime()` (T) and `col_time()` (t) parse into dates, date times, and times as described below. -You might have noticed that each column parser has a one letter abbreviation, which you can instead of the full function call (assuming you're happy with the default arguments): +You might have noticed that each column parser has a one letter abbreviation, which you can use instead of the full function call (assuming you're happy with the default arguments): ```{r, eval = FALSE} read_csv("mypath.csv", col_types = cols( @@ -196,14 +196,14 @@ If these defaults don't work for your data you can supply your own date time for * Seconds: `%S` (integer seconds), `%OS` (partial seconds). -* Time zone: `%Z` (as name, e.g. `America/Chicago`), `%z` (as offset from UTC, - e.g. `+0800`). If you're American, note that "EST" is a Canadian time zone - that does not have daylight savings time. It is \emph{not} Eastern Standard +* Time zone: `%Z` (as name, e.g. `America/Chicago`), `%z` (as offset from UTC, + e.g. `+0800`). If you're American, note that "EST" is a Canadian time zone + that does not have daylight savings time. It is \emph{not} Eastern Standard Time! * AM/PM indicator: `%p`. -* Non-digits: `%.` skips one non-digit charcter, `%*` skips any number of +* Non-digits: `%.` skips one non-digit character, `%*` skips any number of non-digits. The best way to figure out the correct string is to create a few examples in a character vector, and test with one of the parsing functions. For example: @@ -236,11 +236,11 @@ The settings you are most like to need to change are: locale("fr") locale("fr", asciify = TRUE) ``` - + * The character encoding used in the file. If you don't know the encoding you can use `guess_encoding()`. It's not perfect, but if you have a decent sample of text, it's likely to be able to figure it out. - + Readr converts all strings into UTF-8 as this is safest to work with across platforms. (It's also what every stringr operation does.) @@ -264,61 +264,61 @@ Needs to discuss how data types in different languages are converted to R. Simil `data_frame()` is a nice way to create data frames. It encapsulates best practices for data frames: * It never changes an input's type (i.e., no more `stringsAsFactors = FALSE`!). - + ```{r} data.frame(x = letters) %>% sapply(class) data_frame(x = letters) %>% sapply(class) ``` - + This makes it easier to use with list-columns: - + ```{r} data_frame(x = 1:3, y = list(1:5, 1:10, 1:20)) ``` - + List-columns are most commonly created by `do()`, but they can be useful to create by hand. - + * It never adjusts the names of variables: - + ```{r} data.frame(`crazy name` = 1) %>% names() data_frame(`crazy name` = 1) %>% names() ``` * It evaluates its arguments lazily and sequentially: - + ```{r} data_frame(x = 1:5, y = x ^ 2) ``` - * It adds the `tbl_df()` class to the output so that if you accidentally print a large + * It adds the `tbl_df()` class to the output so that if you accidentally print a large data frame you only get the first few rows. - + ```{r} data_frame(x = 1:5) %>% class() ``` * It changes the behaviour of `[` to always return the same type of object: - subsetting using `[` always returns a `tbl_df()` object; subsetting using + subsetting using `[` always returns a `tbl_df()` object; subsetting using `[[` always returns a column. - - You should be aware of one case where subsetting a `tbl_df()` object + + You should be aware of one case where subsetting a `tbl_df()` object will produce a different result than a `data.frame()` object: - + ```{r} df <- data.frame(a = 1:2, b = 1:2) str(df[, "a"]) - + tbldf <- tbl_df(df) str(tbldf[, "a"]) ``` - - * It never uses `row.names()`. The whole point of tidy data is to - store variables in a consistent way. So it never stores a variable as + + * It never uses `row.names()`. The whole point of tidy data is to + store variables in a consistent way. So it never stores a variable as special attribute. - - * It only recycles vectors of length 1. This is because recycling vectors of greater lengths + + * It only recycles vectors of length 1. This is because recycling vectors of greater lengths is a frequent source of bugs. ### Coercion @@ -326,13 +326,13 @@ Needs to discuss how data types in different languages are converted to R. Simil To complement `data_frame()`, dplyr provides `as_data_frame()` to coerce lists into data frames. It does two things: * It checks that the input list is valid for a data frame, i.e. that each element - is named, is a 1d atomic vector or list, and all elements have the same + is named, is a 1d atomic vector or list, and all elements have the same length. - + * It sets the class and attributes of the list to make it behave like a data frame. This modification does not require a deep copy of the input list, so it's very fast. - + This is much simpler than `as.data.frame()`. It's hard to explain precisely what `as.data.frame()` does, but it's similar to `do.call(cbind, lapply(x, data.frame))` - i.e. it coerces each component to a data frame and then `cbinds()` them all together. Consequently `as_data_frame()` is much faster than `as.data.frame()`: ```{r} @@ -353,49 +353,49 @@ There are three key differences between tbl_dfs and data.frames: * When you print a tbl_df, it only shows the first ten rows and all the columns that fit on one screen. It also prints an abbreviated description of the column type: - + ```{r} data_frame(x = 1:1000) ``` - + You can control the default appearance with options: - - * `options(dplyr.print_max = n, dplyr.print_min = m)`: if more than `n` + + * `options(dplyr.print_max = n, dplyr.print_min = m)`: if more than `m` rows print `m` rows. Use `options(dplyr.print_max = Inf)` to always show all rows. - - * `options(dply.width = Inf)` will always print all columns, regardless + + * `options(dplyr.width = Inf)` will always print all columns, regardless of the width of the screen. - -* When you subset a tbl\_df with `[`, it always returns another tbl\_df. + +* When you subset a tbl\_df with `[`, it always returns another tbl\_df. Contrast this with a data frame: sometimes `[` returns a data frame and sometimes it just returns a single column: - + ```{r} df1 <- data.frame(x = 1:3, y = 3:1) class(df1[, 1:2]) class(df1[, 1]) - + df2 <- data_frame(x = 1:3, y = 3:1) class(df2[, 1:2]) class(df2[, 1]) ``` - + To extract a single column it's use `[[` or `$`: - + ```{r} class(df2[[1]]) class(df2$x) ``` -* When you extract a variable with `$`, tbl\_dfs never do partial +* When you extract a variable with `$`, tbl\_dfs never do partial matching. They'll throw an error if the column doesn't exist: - + ```{r, error = TRUE} df <- data.frame(abc = 1) df$a - + df2 <- data_frame(abc = 1) df2$a ``` From 2d987544e988c352ee5df9460cc3819039999a33 Mon Sep 17 00:00:00 2001 From: Brandon Greenwell Date: Thu, 28 Jan 2016 08:47:26 -0500 Subject: [PATCH 009/104] Fixed Typo Removed extra "what". --- robust-code.Rmd | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/robust-code.Rmd b/robust-code.Rmd index 152c577..c50a71f 100644 --- a/robust-code.Rmd +++ b/robust-code.Rmd @@ -29,7 +29,7 @@ The idea of minimising the context needed to understand your code goes beyond ju There are three common classes of surprises in R: -1. Unstable types: What what will `df[, x]` return? You can assume that `df` +1. Unstable types: What will `df[, x]` return? You can assume that `df` is a data frame and `x` is a vector because of their names. But you don't know whether this code will return a data frame or a vector because the behaviour of `[` depends on the length of x. From 0393514ae8179b8fa242fb8f49438403fa698c0c Mon Sep 17 00:00:00 2001 From: Radu Grosu Date: Thu, 28 Jan 2016 21:10:04 +0000 Subject: [PATCH 010/104] Update tidy.Rmd typos --- tidy.Rmd | 20 ++++++++++---------- 1 file changed, 10 insertions(+), 10 deletions(-) diff --git a/tidy.Rmd b/tidy.Rmd index 9fc6ece..96fee4f 100644 --- a/tidy.Rmd +++ b/tidy.Rmd @@ -8,7 +8,7 @@ title: Tidy data > "Tidy datasets are all alike but every messy dataset is messy in its > own way." – Hadley Wickham -Data science, at its heart, is a computer programming exercise. Data scientists use computers to store, transform, visualize, and model their data. Each computer program will expect your data to be organized in a predetermined way, which may vary from program to program. To be an effective data scientist, you will need to be able to reorganize your data to match the format required by your program. +Data science, at its heart, is a computer programming exercise. Data scientists use computers to store, transform, visualize, and model their data. Each computer program will expect your data to be organized in a predetermined way, which may vary from program to program. To be an effective data scientist, you will need to be able to reorganize your data to match the format required by your program. In this chapter, you will learn the best way to organize your data for R, a task that we call data tidying. Tidying your data will save you hours of time and make your data much easier to visualize, transform, and model with R. @@ -79,7 +79,7 @@ At this point, you might think that tidy data is so obvious that it is trivial. Tidy data works well with R because it takes advantage of R's traits as a vectorized programming language. Data structures in R are organized around vectors, and R's functions are optimized to work with vectors. Tidy data takes advantage of both of these traits. -Tidy data arranges values so that the relationships between variables in a data set will parallel the relationship between vectors in R's storage objects. R stores tabular data as a data frame, a list of atomic vectors arranged to look like a table. Each column in the table is an atomic vector in the list. In tidy data, each variable in the data set is assigned to its own column, i.e., its own vector in the data frame. +Tidy data arranges values so that the relationships between variables in a data set will parallel the relationship between vectors in R's storage objects. R stores tabular data as a data frame, a list of atomic vectors arranged to look like a table. Each column in the table is an atomic vector in the list. In tidy data, each variable in the data set is assigned to its own column, i.e., its own vector in the data frame. ```{r, echo = FALSE} knitr::include_graphics("images/tidy-2.png") @@ -87,7 +87,7 @@ knitr::include_graphics("images/tidy-2.png") *A data frame is a list of vectors that R displays as a table. When your data is tidy, the values of each variable fall in their own column vector.* -As a result, you can extract the all of the values of a variable in a tidy data set by extracting the column vector that contains the variable. You can do this easily with R's list syntax, i.e. +As a result, you can extract all the values of a variable in a tidy data set by extracting the column vector that contains the variable. You can do this easily with R's list syntax, i.e. ```{r} table1$cases @@ -191,7 +191,7 @@ After you collect your input, you can calculate the rate. ```{r eval = FALSE} # Data set four -cases <- c(table4$1999, table4$2000, table4$2001) +cases <- c(table4$1999, table4$2000, table4$2001) population <- c(table5$1999, table5$2000, table5$2001) cases / population * 10000 ``` @@ -214,7 +214,7 @@ The two most important functions in `tidyr` are `gather()` and `spread()`. Each A key value pair is a simple way to record information. A pair contains two parts: a *key* that explains what the information describes, and a *value* that contains the actual information. So for example, this would be a key value pair: - Password: 0123456789 + Password: 0123456789 `0123456789` is the value, and it is associated with the key `Password`. @@ -238,7 +238,7 @@ Data values form natural key value pairs. The value is the value of the pair and Cases: 80488 Cases: 212258 Cases: 213766 - + However, the key value pairs would cease to be a useful data set because you no longer know which values belong to the same observation. Every cell in a table of data contains one half of a key value pair, as does every column name. In tidy data, each cell will contain a value and each column name will contain a key, but this doesn't need to be the case for untidy data. Consider `table2`. @@ -247,7 +247,7 @@ Every cell in a table of data contains one half of a key value pair, as does eve table2 ``` -In `table2`, the `key` column contains only keys (and not just because the column is labelled `key`). Conveniently, the `value` column contains the values associated with those keys. +In `table2`, the `key` column contains only keys (and not just because the column is labeled `key`). Conveniently, the `value` column contains the values associated with those keys. You can use the `spread()` function to tidy this layout. @@ -269,7 +269,7 @@ knitr::include_graphics("images/tidy-8.png") *`spread()` distributes a pair of key:value columns into a field of cells. The unique keys in the key column become the column names of the field of cells.* -You can see that `spread()` maintains each of the relationships expressed in the original data set. The output contains the four original variables, *country*, *year*, *population*, and *cases*, and the values of these variables are grouped according to the orginal observations. As a bonus, now the layout of these relationships is tidy. +You can see that `spread()` maintains each of the relationships expressed in the original data set. The output contains the four original variables, *country*, *year*, *population*, and *cases*, and the values of these variables are grouped according to the original observations. As a bonus, now the layout of these relationships is tidy. `spread()` takes three optional arguments in addition to `data`, `key`, and `value`: @@ -367,7 +367,7 @@ You can also pass an integer or vector of integers to `sep`. `separate()` will i separate(table3, year, into = c("century", "year"), sep = 2) ``` -You can futher customize `separate()` with the `remove`, `convert`, and `extra` arguments: +You can further customize `separate()` with the `remove`, `convert`, and `extra` arguments: - **`remove`** - Set `remove = FALSE` to retain the column of values that were separated in the final data frame. - **`convert`** - By default, `separate()` will return new columns as character columns. Set `convert = TRUE` to convert new columns to double (numeric), integer, logical, complex, and factor columns with `type.convert()`. @@ -462,4 +462,4 @@ who <- spread(who, var, value) who ``` -The `who` data set is now tidy. It is far from sparkling (for example, it contains several redundant columns and many missing values), but it will now be much easier to work with in R. +The `who` data set is now tidy. It is far from sparkling (for example, it contains several redundant columns and many missing values), but it will now be much easier to work with in R. From ae06075c35af4048fb3ff52e61468d6a54ff36f6 Mon Sep 17 00:00:00 2001 From: Radu Grosu Date: Sat, 30 Jan 2016 13:13:46 +0000 Subject: [PATCH 011/104] Update relational-data.Rmd typos --- relational-data.Rmd | 174 ++++++++++++++++++++++---------------------- 1 file changed, 87 insertions(+), 87 deletions(-) diff --git a/relational-data.Rmd b/relational-data.Rmd index 501ccab..0e918ed 100644 --- a/relational-data.Rmd +++ b/relational-data.Rmd @@ -16,34 +16,34 @@ knitr::opts_chunk$set(fig.path = "figures/", cache = TRUE) It's rare that a data analysis involves only a single table of data. Typically you have many tables of data, and you must combine them to answer the questions that you're interested in. Collectively, multiple tables of data are called __relational data__ because it is the relations, not just the individual datasets, that are particularly important. -Relations are always defined between a pair of tables. All other relations are built up from this simple idea: the relations of three or more tables are always a property of the relations between each pair; sometimes both elements of a pair can be the same table. +Relations are always defined between a pair of tables. All other relations are built up from this simple idea: the relations of three or more tables are always a property of the relations between each pair; sometimes both elements of a pair can be the same table. -To work with relational data you need verbs that work with pairs of tables. There are three families of verbs design to work with relational data: +To work with relational data you need verbs that work with pairs of tables. There are three families of verbs designed to work with relational data: -* __Mutating joins__, which add new variables to one data frame from matching +* __Mutating joins__, which add new variables to one data frame from matching rows in another. -* __Filtering joins__, which filter observations from one data frame based on +* __Filtering joins__, which filter observations from one data frame based on whether or not they match an observation in the other table. * __Set operations__, which treat observations like they were set elements. -The most common place to find relational data is in a _relational_ database management system, a term that encompasses almost all modern databases. If you've used a database before, you've almost certainly used SQL. If so, you should find the concepts in this chapter familiar, although their expression in dplyr is little different. Generally, dplyr is a little easier to use than SQL because it's specialised to data analysis: it makes common data analysis operations easier, at the expense of making it difficult to do other things. +The most common place to find relational data is in a _relational_ database management system, a term that encompasses almost all modern databases. If you've used a database before, you've almost certainly used SQL. If so, you should find the concepts in this chapter familiar, although their expression in dplyr is a little different. Generally, dplyr is a little easier to use than SQL because it's specialised to data analysis: it makes common data analysis operations easier, at the expense of making it difficult to do other things. ## nycflights13 {#nycflights13-relational} -You'll learn about relational data with other datasets from the nycflights13 package. As well as the `flights` table that you've worked with so far, nycflights13 contains a four related data frames: +You'll learn about relational data with other datasets from the nycflights13 package. As well as the `flights` table that you've worked with so far, nycflights13 contains four other related data frames: -* `airlines` lets you look up the full carrier name from its abbreviated +* `airlines` lets you look up the full carrier name from its abbreviated code: - + ```{r} airlines ``` * `airports` gives information about each airport, identified by the `faa` airport code: - + ```{r} airports ``` @@ -53,7 +53,7 @@ You'll learn about relational data with other datasets from the nycflights13 pac ```{r} planes ``` - + * `weather` gives the weather at each NYC airport for each hour: ```{r} @@ -66,16 +66,16 @@ One way to show the relationships between the different tables is with a drawing knitr::include_graphics("diagrams/relational-nycflights.png") ``` -This diagram is a little overwhelming, and even so it's simple compared to some you'll see in the wild! The key to understanding diagrams like this is to remember each relation always concerns a pair of tables. You don't need to understand the whole thing; you just need the understand the chain of relations between the tables that you are interested in. +This diagram is a little overwhelming, and even so it's simple compared to some you'll see in the wild! The key to understanding diagrams like this is to remember each relation always concerns a pair of tables. You don't need to understand the whole thing; you just need the understand the chain of relations between the tables that you are interested in. For nycflights13: * `flights` connects to `planes` via single variable, `tailnum`. `flights` connect `airlines` with the `carrier` variable. -* `flights` connects to `airports` in two ways: via the `origin` or the +* `flights` connects to `airports` in two ways: via the `origin` or the `dest`. - + * `flights` connects to `weather` via `origin` (the location), and `year`, `month`, `day` and `hour` (the time). @@ -87,7 +87,7 @@ For nycflights13: 1. I forgot to draw the a relationship between `weather` and `airports`. What is the relationship and what should it look like in the diagram? - + 1. `weather` only contains information for the origin (NYC) airports. If it contained weather records for all airports in the USA, what additional relation would it define with `flights`? @@ -97,7 +97,7 @@ For nycflights13: or reject this hypothesis using data. 1. We know that some days of the year are "special", and fewer people than - usual fly on them. How might you represent that data as a data frame? + usual fly on them. How might you represent that data as a data frame? What would be the primary keys of that table? How would it connect to the existing tables? @@ -108,11 +108,11 @@ The variables used to connect each pair of tables are called __keys__. A key is There are two types of keys: * A __primary key__ uniquely identifies an observation in its own table. - For example, `planes$tailnum` is a primary key because it uniquely identifies + For example, `planes$tailnum` is a primary key because it uniquely identifies each plane. * A __foreign key__ uniquely identifies an observation in another table. - For example, the `flights$tailnum` is a foregin key because it matches each + For example, the `flights$tailnum` is a foreign key because it matches each flight to a unique plane. A variable can be both part of primary key _and_ a foreign key. For example, `origin` is part of the `weather` primary key, and is also a foreign key for the `airport` table. @@ -124,36 +124,36 @@ planes %>% count(tailnum) %>% filter(n > 1) weather %>% count(year, month, day, hour, origin) %>% filter(n > 1) ``` -Sometimes a table does't have an explicit primary key: each row is an observation, but no combination of variables reliably identifies it. For example, what's the primary key in the `flights` table? You might think it would be the date plus the flight or tail number, but neither of those are unique: +Sometimes a table doesn't have an explicit primary key: each row is an observation, but no combination of variables reliably identifies it. For example, what's the primary key in the `flights` table? You might think it would be the date plus the flight or tail number, but neither of those are unique: ```{r} flights %>% count(year, month, day, flight) %>% filter(n > 1) flights %>% count(year, month, day, tailnum) %>% filter(n > 1) ``` -When starting to work with this data, I had naively assumed that each flight number would be only used once per day: that would make it much easiser to communicate problems with a specific flight. Unfortunately that is not the case! If a table lacks a primary key, it's sometimes useful to add one with `row_number()`. That makes it easier to match observations if you've done some filtering and want to check back in with the original data. This is called a surrogate key. +When starting to work with this data, I had naively assumed that each flight number would be only used once per day: that would make it much easier to communicate problems with a specific flight. Unfortunately that is not the case! If a table lacks a primary key, it's sometimes useful to add one with `row_number()`. That makes it easier to match observations if you've done some filtering and want to check back in with the original data. This is called a surrogate key. -A primary key and the corresponding foreign key in another table form a __relation__. Relations are typically one-to-many. For example, each flight has one plane, but each plane has many flights. In other data, you'll occassionaly see a 1-to-1 relationship. You can think of this as a special case of 1-to-many. It's possible to model many-to-many relations with a many-to-1 relation plus a 1-to-many relation. For example, in this data there's a many-to-many relationship between airlines and airports: each airport flies to many airlines; each airport hosts many airlines. +A primary key and the corresponding foreign key in another table form a __relation__. Relations are typically one-to-many. For example, each flight has one plane, but each plane has many flights. In other data, you'll occasionally see a 1-to-1 relationship. You can think of this as a special case of 1-to-many. It's possible to model many-to-many relations with a many-to-1 relation plus a 1-to-many relation. For example, in this data there's a many-to-many relationship between airlines and airports: each airport flies to many airlines; each airport hosts many airlines. ### Exercises 1. Identify the keys in the following datasets - 1. `Lahman::Batting`, + 1. `Lahman::Batting`, 1. `babynames::babynames` 1. `nasaweather::atmos` 1. `fueleconomy::vehicles` - -1. Draw a diagram illustrating the connections between the `Batting`, - `Master`, and `Salary` tables in the Lahman package. Draw another diagram + +1. Draw a diagram illustrating the connections between the `Batting`, + `Master`, and `Salary` tables in the Lahman package. Draw another diagram that shows the relationship between `Master`, `Managers`, `AwardsManagers`. - - How would you characterise the relationship between the `Batting`, + + How would you characterise the relationship between the `Batting`, `Pitching`, and `Fielding` tables? ## Mutating joins {#mutating-joins} -The first tool we'll look at for combining a pair of tables is the __mutating join__. A mutating join allows you to combine variables from two tables. It first matches observations by their keys, then copies across variables from one table to the other. +The first tool we'll look at for combining a pair of tables is the __mutating join__. A mutating join allows you to combine variables from two tables. It first matches observations by their keys, then copies across variables from one table to the other. Like `mutate()`, the join functions add variables to the right, so if you have a lot of variables already, the new variables won't get printed out. For these examples, we'll make it easier to see what's going on in the examples by creating a narrower dataset: @@ -161,19 +161,19 @@ Like `mutate()`, the join functions add variables to the right, so if you have a (flights2 <- flights %>% select(year:day, hour, origin, dest, tailnum, carrier)) ``` -(When you're in RStudio, you can use `View()` to avoid this problem). +(When you're in RStudio, you can use `View()` to avoid this problem). For example, imagine you want to add the full airline name to the `flights` data. You can combine the `airlines` and `carrier` data frames with `left_join()`: ```{r} -flights2 %>% +flights2 %>% left_join(airlines, by = "carrier") ``` The result of joining airlines to flights is an additional variable: `carrier`. This is why I call this type of join a mutating join. In this case, you could have got to the same place using `mutate()` and basic subsetting: ```{r} -flights2 %>% +flights2 %>% mutate(carrier = airlines$name[match(carrier, airlines$carrier)]) ``` @@ -243,7 +243,7 @@ Graphically, that looks like: knitr::include_graphics("diagrams/join-outer.png") ``` -The most commonly used join is the left join: you use this when ever you lookup additional data out of another table, becasuse it preserves the original observations even when there isn't a match. The left join should be your default join: use it unless you have a strong reason to prefer one of the others. +The most commonly used join is the left join: you use this whenever you lookup additional data out of another table, because it preserves the original observations even when there isn't a match. The left join should be your default join: use it unless you have a strong reason to prefer one of the others. Another way to depict the different types of joins is with a Venn diagram: @@ -260,7 +260,7 @@ So far all the diagrams have assumed that the keys are unique. But that's not al 1. One table has duplicate keys. This is useful when you want to add in additional information as there is typically a one-to-many relationship. - + ```{r, echo = FALSE, out.width = "75%"} knitr::include_graphics("diagrams/join-one-to-many.png") ``` @@ -275,14 +275,14 @@ So far all the diagrams have assumed that the keys are unique. But that's not al left_join(x, y, by = "key") ``` -1. Both tables have duplicate keys. This is usually an error because in +1. Both tables have duplicate keys. This is usually an error because in neither table do the keys uniquely identify an observation. When you join duplicated keys, you get all possible combinations, the Cartesian product: - + ```{r, echo = FALSE, out.width = "75%"} knitr::include_graphics("diagrams/join-many-to-many.png") ``` - + ```{r} x <- data_frame(key = c(1, 2, 2, 3), val_x = paste0("x", 1:4)) y <- data_frame(key = c(1, 2, 2, 3), val_y = paste0("y", 1:4)) @@ -293,37 +293,37 @@ So far all the diagrams have assumed that the keys are unique. But that's not al So far, the pairs of tables have always been joined by a single variable, and that variable has the same name in both tables. That constraint was encoded by `by = "key"`. You can use other values for `by` to connect the tables in other ways: - * The default, `by = NULL`, uses all variables that appear in both tables, - the so called __natural__ join. For example, the flights and weather tables + * The default, `by = NULL`, uses all variables that appear in both tables, + the so called __natural__ join. For example, the flights and weather tables match on their common variables: `year`, `month`, `day`, `hour` and `origin`. - + ```{r} flights2 %>% left_join(weather) ``` - - * A character vector, `by = "x"`. This is like a natural join, but uses only - some of the common variables. For example, `flights` and `planes` have - `year` variables, but they mean different things so we only want to join by + + * A character vector, `by = "x"`. This is like a natural join, but uses only + some of the common variables. For example, `flights` and `planes` have + `year` variables, but they mean different things so we only want to join by `tailnum`. - + ```{r} flights2 %>% left_join(planes, by = "tailnum") ``` - + Note that the `year` variables (which appear in both input data frames, - but are not constrained to be equal) are disambiguated in the output with + but are not constrained to be equal) are disambiguated in the output with a suffix. * A named character vector: `by = c("a" = "b")`. This will - match variable `a` in table `x` to variable `b` in table `y`. The + match variable `a` in table `x` to variable `b` in table `y`. The variables from `x` will be used in the output. - + For example, if we want to draw a map we need to combine the flights data with the airports data which contains the location (`lat` and `long`) of - each airport. Each flight has an origin and destination `airport`, so we + each airport. Each flight has an origin and destination `airport`, so we need to specify which one we want to join to: - + ```{r} flights2 %>% left_join(airports, c("dest" = "faa")) flights2 %>% left_join(airports, c("origin" = "faa")) @@ -334,33 +334,33 @@ So far, the pairs of tables have always been joined by a single variable, and th 1. Compute the average delay by destination, then join on the `airports` data frame so you can show the spatial distribution of delays. Here's an easy way to draw a map of the United States: - + ```{r, include = FALSE} - airports %>% - semi_join(flights, c("faa" = "dest")) %>% - ggplot(aes(lon, lat)) + + airports %>% + semi_join(flights, c("faa" = "dest")) %>% + ggplot(aes(lon, lat)) + borders("state") + geom_point() + coord_quickmap() ``` - + You might want to use the `size` or `colour` of the points to display the average delay for each airport. 1. Is there a relationship between the age of a plane and its delays? 1. What weather conditions make it more likely to see a delay? - + 1. What happened on June 13 2013? Display the spatial pattern of delays, - and then use google to cross-reference with the weather. - + and then use Google to cross-reference with the weather. + ```{r, eval = FALSE, include = FALSE} worst <- filter(not_cancelled, month == 6, day == 13) - worst %>% - group_by(dest) %>% - summarise(delay = mean(arr_delay), n = n()) %>% - filter(n > 5) %>% - inner_join(airports, by = c("dest" = "faa")) %>% + worst %>% + group_by(dest) %>% + summarise(delay = mean(arr_delay), n = n()) %>% + filter(n > 5) %>% + inner_join(airports, by = c("dest" = "faa")) %>% ggplot(aes(lon, lat)) + borders("state") + geom_point(aes(size = n, colour = delay)) + @@ -369,7 +369,7 @@ So far, the pairs of tables have always been joined by a single variable, and th ### Other implementations -`base::merge()` can perform all four types of mutating join: +`base::merge()` can perform all four types of mutating join: dplyr | merge -------------------|------------------------------------------- @@ -385,17 +385,17 @@ SQL is the inspiration for dplyr's conventions, so the translation is straightfo dplyr | SQL -----------------------------|------------------------------------------- `inner_join(x, y, by = "z")` | `SELECT * FROM x INNER JOIN y USING (z)` -`left_join(x, y, by = "z")` | `SELECT * FROM x LEFT OUTER JOIN USING (z)` -`right_join(x, y, by = "z")` | `SELECT * FROM x RIGHT OUTER JOIN USING (z)` -`full_join(x, y, by = "z")` | `SELECT * FROM x FULL OUTER JOIN USING (z)` +`left_join(x, y, by = "z")` | `SELECT * FROM x LEFT OUTER JOIN y USING (z)` +`right_join(x, y, by = "z")` | `SELECT * FROM x RIGHT OUTER JOIN y USING (z)` +`full_join(x, y, by = "z")` | `SELECT * FROM x FULL OUTER JOIN y USING (z)` -Note that "INNER" and "OUTER" are optional, and often ommitted. +Note that "INNER" and "OUTER" are optional, and often omitted. -Joining different variables between the tables, e.g. `inner_join(x, y, by = c("a" = "b"))` uses a slightly different syntax in SQL: `SELECT * FROM x INNER JOIN y ON x.a = y.b`. As this syntax suggests SQL supports a wide range of join types than dplyr because you can connect the tables using constraints other than equiality (sometimes called non-equijoins). +Joining different variables between the tables, e.g. `inner_join(x, y, by = c("a" = "b"))` uses a slightly different syntax in SQL: `SELECT * FROM x INNER JOIN y ON x.a = y.b`. As this syntax suggests SQL supports a wide range of join types than dplyr because you can connect the tables using constraints other than equality (sometimes called non-equijoins). ## Filtering joins {#filtering-joins} -Filtering joins match obserations in the same way as mutating joins, but affect the observations, not the variables. There are two types: +Filtering joins match observations in the same way as mutating joins, but affect the observations, not the variables. There are two types: * `semi_join(x, y)` __keeps__ all observations in `x` that have a match in `y`. * `anti_join(x, y)` __drops__ all observations in `x` that have a match in `y`. @@ -403,7 +403,7 @@ Filtering joins match obserations in the same way as mutating joins, but affect Semi-joins are useful for matching filtered summary tables back to the original rows. For example, imagine you've found the top ten most popular destinations: ```{r} -top_dest <- flights %>% +top_dest <- flights %>% count(dest, sort = TRUE) %>% head(10) top_dest @@ -444,21 +444,21 @@ knitr::include_graphics("diagrams/join-anti.png") Anti-joins are are useful for diagnosing join mismatches. For example, when connecting `flights` and `planes`, you might be interested to know that there are many `flights` that don't have a match in `planes`: ```{r} -flights %>% - anti_join(planes, by = "tailnum") %>% +flights %>% + anti_join(planes, by = "tailnum") %>% count(tailnum, sort = TRUE) ``` ### Exercises -1. What does it mean for a flight to have a missing `tailnum`? What do the +1. What does it mean for a flight to have a missing `tailnum`? What do the tail numbers that don't have a matching record in `planes` have in common? (Hint: one variable explains ~90% of the problem.) 1. Find the 48 hours (over the course of the whole year) that have the worst - delays. Cross-reference it with the `weather` data. Can you see any - patterns? - + delays. Cross-reference it with the `weather` data. Can you see any + patterns? + 1. What does `anti_join(flights, airports, by = c("dest" = "faa"))` tell you? What does `anti_join(airports, flights, by = c("dest" = "faa"))` tell you? @@ -468,25 +468,25 @@ The data you've been working with in this chapter has been cleaned up so that yo 1. Start by identifying the variables that form the primary key in each table. You should usually do this based on your understanding of the data, not - empirically by looking for a combination of variables that give a + empirically by looking for a combination of variables that give a unique identifier. If you just look for variables without thinking about - what they mean, you might get (un)lucky and find a combination that's - unique in your current data but the relationship might not be true in - general. - + what they mean, you might get (un)lucky and find a combination that's + unique in your current data but the relationship might not be true in + general. + ```{r} airports %>% count(alt, lat) %>% filter(n > 1) ``` -1. Check that none of the variables in the primary key are missing. If +1. Check that none of the variables in the primary key are missing. If a value is missing then it can't identify an observation! - + 1. Check that your foreign keys match primary keys in another table. The best way to do this is with an `anti_join()`. It's common for keys not to match because of data entry errors. Fixing these is often a lot of - work. - - If you do have missing keys, you'll need to be thoughtful about your + work. + + If you do have missing keys, you'll need to be thoughtful about your use of inner vs. outer joins, carefully considering whether or not you want to drop rows that don't have a match. @@ -494,7 +494,7 @@ Be aware that simply checking the number of rows before and after the join is no ## Set operations {#set-operations} -The final type of two-table verb is set operations. Generally, I use these the least frequently, but they are occassionally useful when you want to break a single complex filter into simpler pieces that you then combine. +The final type of two-table verb is set operations. Generally, I use these the least frequently, but they are occasionally useful when you want to break a single complex filter into simpler pieces that you then combine. All these operations work with a complete row, comparing the values of every variable. These expect the `x` and `y` inputs to have the same variables, and treat the observations like sets: From 326d5b8511ee400391911a6ddb71828f9fa7864a Mon Sep 17 00:00:00 2001 From: hadley Date: Wed, 3 Feb 2016 11:41:44 -0600 Subject: [PATCH 012/104] Note about turning lists into data frames --- lists.Rmd | 7 +++++++ 1 file changed, 7 insertions(+) diff --git a/lists.Rmd b/lists.Rmd index d5472f9..d1fadfb 100644 --- a/lists.Rmd +++ b/lists.Rmd @@ -511,6 +511,13 @@ df <- dplyr::data_frame(x = 1:3, y = c("a", "b", "c")) df %>% transpose() %>% str() ``` +### Turning lists into data frames + +* Have a deeply nested list with missing pieces +* Need a tidy data frame so you can visualise, transform, model etc. +* What do you do? +* By hand with purrr, talk about `fromJSON` and `tidyJSON` + ### Exercises ## Dealing with failure From 19a3e926a9ea2db7a2099fdb8654b2b459565409 Mon Sep 17 00:00:00 2001 From: nate-d-olson Date: Thu, 4 Feb 2016 09:06:34 -0500 Subject: [PATCH 013/104] fixed small typos --- transform.Rmd | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/transform.Rmd b/transform.Rmd index 23a7895..85433e7 100644 --- a/transform.Rmd +++ b/transform.Rmd @@ -236,7 +236,7 @@ filter(flights, !(arr_delay > 120 | dep_delay > 120)) filter(flights, arr_delay <= 120, dep_delay <= 120) ``` -Note that R has both `&` and `|` and `&&` and `||`. `&` and `|` are vectorised: you give them two vectors of logical values and they return a vector of logical values. `&&` and `||` are scalar operators: you give them individual `TRUE`s or `FALSE`s. They're used if `if` statements when programming. You'll learn about that later on. +Note that R has both `&` and `|` and `&&` and `||`. `&` and `|` are vectorised: you give them two vectors of logical values and they return a vector of logical values. `&&` and `||` are scalar operators: you give them individual `TRUE`s or `FALSE`s. They're used in `if` statements when programming. You'll learn about that later on. Sometimes you want to find all rows after the first `TRUE`, or all rows until the first `FALSE`. The cumulative functions `cumany()` and `cumall()` allow you to find these values: @@ -535,7 +535,7 @@ ggplot(flights, aes(dep_sched %% 60)) + geom_histogram(binwidth = 1) ggplot(flights, aes(air_time - airtime2)) + geom_histogram() ``` -1. Currently `dep_time()` and `arr_time()` are convenient to look at, but +1. Currently `dep_time` and `arr_time` are convenient to look at, but hard to compute with because they're not really continuous numbers. Convert them to a more convenient representation of number of minutes since midnight. From 671a21b124d6263436b8fcbfa6dc2bf4d1afa15b Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 11 Feb 2016 07:58:53 -0600 Subject: [PATCH 014/104] Update functions --- functions.Rmd | 193 +++++++++++++++++++++++++++++++++++++++++++++++--- 1 file changed, 185 insertions(+), 8 deletions(-) diff --git a/functions.Rmd b/functions.Rmd index 80f2498..2518321 100644 --- a/functions.Rmd +++ b/functions.Rmd @@ -249,6 +249,8 @@ When you run a pipe interactively, it's easy to see if something goes wrong. Whe ## Functions +One of the best ways to grow in your capabilities as a user of R for data science is to write functions. Functions allow you to automate common tasks, instead of using copy-and-paste. Writing good functions is a lifetime journey: you won't learn everything but you'll hopefully get start walking in the right direction. + Whenever you've copied and pasted code more than twice, you need to take a look at it and see if you can extract out the common components and make a function. For example, take a look at this code. What does it do? ```{r} @@ -319,7 +321,7 @@ This makes it more clear what we're doing, and avoids one class of copy-and-past ### Practice -Practice turning the following code snippets into functions. Think about how you can re-write them to be as clear an expressive as possible. +Practice turning the following code snippets into functions. Think about how you can re-write them to be as clear and expressive as possible. ### Function components @@ -362,15 +364,116 @@ geom_lm <- function(formula = y ~ x, colour = alpha("steelblue", 0.5), This allows you to use any other arguments of `geom_smooth()`, even thoses that aren't explicitly listed in your wrapper (and even arguments that don't exist yet in the version of ggplot2 that you're using). +Note that arguments in R are lazily evaluated: they're not computed until they're needed. That means if they're never used, they're never called: + +```{r} +g <- function(a, b, c) { + a + b +} +g(1, 2, stop("Not used!")) +``` + +You can read more about lazy evaluation at + #### Body -The body of the function does the actual work. The return value of a function is the last thing that it does. +The body of the function does the actual work. The value returned by the function is the last statement it evaluates. Unlike other languages all statements in R return a value. An `if` statement returns the value from the branch that was chosen: -You can use an explicit `return()` statement, but this is not needed, and is best avoided except when you want to return early. +```{r} +greeting <- function(time = lubridate::now()) { + hour <- lubridate::hour(time) + + if (hour < 12) { + "Good morning" + } else if (hour < 18) { + "Good afternoon" + } else { + "Good evening" + } +} +greeting() +``` + +That also means you can assign the result of an `if` statement to a variable: + +```{r} +y <- 10 +x <- if (y < 20) "Too low" else "Too high" +``` + +You can explicitly return early from a function with `return()`. I think it's best to save the use of `return()` to signal when you're returning early for some special reason. + +It's sometimes useful when you want to write code like this: + +```{r, eval = FALSE} +f <- function() { + if (x) { + # Do + # something + # that + # takes + # many + # lines + # to + # express + } else { + # return something short + } +} +``` + +Because you can rewrite it as: + +```{r, eval = FALSE} + +f <- function() { + if (!x) { + return(something_short) + } + + # Do + # something + # that + # takes + # many + # lines + # to + # express +} +``` + +Some functions return "invisible" values. These are not printed out by default but can be saved to a variable: + +```{r} +f <- function() { + invisible(42) +} + +f() + +x <- f() +x +``` + +You can also force printing by surrounding the call in parentheses: + +```{r} +(f()) +``` + +Invisible values are mostly used when your function is called primarily for its side-effects (e.g. printing, plotting, or saving a file). It's nice to be able pipe such functions together, so returning the main input value is useful. This allows you to do things like: + +```{r, eval = FALSE} +library(readr) + +mtcars %>% + write_csv("mtcars.csv") %>% + write_tsv("mtcars.tsv") +``` #### Environment -The environment of a function control where values are looked up from. Take this function for example: +The environment of a function controls how R finds the value associated with a name. For example, take this function: ```{r} f <- function(x) { @@ -378,7 +481,7 @@ f <- function(x) { } ``` -In many programming languages, this would be an error, because `y` is not defined inside the function. However, in R this is valid code. Since `y` is not defined inside the function, R will look in the environment where the function was defined: +In many programming languages, this would be an error, because `y` is not defined inside the function. In R, this is valid code because R uses rules called lexical scoping to determine the value associated with a name. Since `y` is not defined inside the function, R will look where the function was defined: ```{r} y <- 100 @@ -401,19 +504,93 @@ This consistent set of rules allows for a number of powerful tool that are unfor ### Making functions with magrittr -One cool feature of the pipe is that it's also very easy to create functions with it. +Another way to write functions is using magrittr. You've already seen how to run a concrete magrittr pipeline: + +```{r} +library(dplyr) +mtcars %>% + filter(mpg > 5) %>% + group_by(cyl) %>% + summarise(n = n()) +``` + +You can easily turn that into a function by using `.` as the first object: + +```{r} +my_fun <- . %>% + filter(mpg > 5) %>% + group_by(cyl) %>% + summarise(n = n()) +my_fun + +my_fun(mtcars) +``` + +This is a great way to create a quick and dirty function if you've already made one pipe and now want to re-apply it in many places. ### Non-standard evaluation -One challenge with writing functions is that many of the functions you've used in this book use non-standard evaluation to minimise typing. This makes these functions great for interactive use, but it does make it more challenging to program with them, because you need to use more advanced techniques. +One challenge with writing functions is that many of the functions you've used in this book use non-standard evaluation to minimise typing. This makes these functions great for interactive use, but it does make it more challenging to program with them, because you need to use more advanced techniques. For example, imagine you find yourself doing this pattern very commonly: -Unfortunately these techniques are beyond the scope of this book, but you can learn the techniques with online resources: +```{r} +mtcars %>% + group_by(cyl) %>% + summarise(mean = mean(mpg, na.rm = TRUE), n = n()) %>% + filter(n > 10) %>% + arrange(desc(mean)) + +ggplot2::diamonds %>% + group_by(cut) %>% + summarise(mean = mean(price, na.rm = TRUE), n = n()) %>% + filter(n > 10) %>% + arrange(desc(mean)) + +nycflights13::planes %>% + group_by(model) %>% + summarise(mean = mean(year, na.rm = TRUE), n = n()) %>% + filter(n > 100) %>% + arrange(desc(mean)) +``` + +You'd like to be able to write a function with arguments data frame, group and variable so you could rewrite the above code as: + +```{r, eval = FALSE} +mtcars %>% + mean_by(cyl, mpg, n = 10) + +ggplot2::diamonds %>% + mean_by(cut, price, n = 10) + +nycflights13::planes %>% + mean_by(model, year, n = 100) +``` + +Unfortunately the obvious approach doesn't work: + +```{r} +mean_by <- function(data, group_var, mean_var, n = 10) { + data %>% + group_by(group_var) %>% + summarise(mean = mean(mean_var, na.rm = TRUE), n = n()) %>% + filter(n > 100) %>% + arrange(desc(mean)) +} +``` + +Because this tells dplyr to group by `group_var` and compute the mean of `mean_var` neither of which exist in the data frame. A similar problem exists in ggplot2. + +I've only really recently understood this problem well, so the solutions are currently rather complicated and beyond the scope of this book. You can learn them online techniques with online resources: * Programming with ggplot2 (an excerpt from the ggplot2 book): http://rpubs.com/hadley/97970 * Programming with dplyr: still hasn't been written. +* Understanding non-standard evaluation in general: + . + +This is definitely an advanced topic, and I haven't done a good job of either explaining well or providing tools to make it easy, or being consistent across packages. So don't worry if you find it hard! + ### Exercises 1. Follow to From d9ef8b15bc60edf8753df8cade1ed39c8ae8d58b Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 11 Feb 2016 08:11:10 -0600 Subject: [PATCH 015/104] Correct subsetting. Fixes #34 --- diagrams/lists-subsetting.png | Bin 35285 -> 35383 bytes diagrams/lists.graffle | Bin 5887 -> 5902 bytes 2 files changed, 0 insertions(+), 0 deletions(-) diff --git a/diagrams/lists-subsetting.png b/diagrams/lists-subsetting.png index 68ad0231977361555d053f31ee9f4a369eed6743..f7c6f73e60bd32f935dc3c8ea1717dcb65a9fe63 100644 GIT binary patch literal 35383 zcmeFZ1yGfL6gCLgs{#fM3epV{(hW+3bhjcP-3TbDA_CGS-CatTfB{NNcPI^lqyiFq zu8RL}cV}m3c4ue4on2?VUf=u1FVA_-bDr}Cswl}^!Xm*!LqoeHCo8FjhIZx_8X95} z0|7@uA4#IaKj_YCGPlr5y00z6e=r?nb)C`Bs0LAg(UD0N$#BA;rG}1+j^b^>d-k?$ zcTMe0%-Gy*9pG#Oueh z{As6)rTKqPvUC31E$ARS>KFDKY#i+W?hTg;qmBwn*xNcdnK?Vd{Y80%f1mlkI`-dl z{+zF3VeeuOqu^wDPtMN8%n2@bxr=I@DCgg+|Bui3-`-2v$t#e|6w5hjPmcJFwCM@!tDR1Ocd+YEaxN|nmC%AoOuzdSNz*kBCb$(a6eH^zph(G8xmfop!%Lswd$Mc{)oJ;dZavQUt`|1vtZNr z@#K21b+75452n6F8QP{Sim(kCpVS(It3tfpmAI~Fje9@4UXy_Q?&AbTx zQF@N8TWJ4|9mb*AU3-A~@z1d$T3^!pX4O>Of3ARo%^~m4{k|G?f^Q7cVYcWS@6%_0 zZ;6JeaUA*g9p_afnq5-NuHnwW@oCH&!=!Ij~$`!4ciIamXQn++{Tx#aNOBl8LTxGI^1|4CbV8- zU@sRS9*%r`?a7N^yhlWQC6c}b0cc2J`d6lHk?9fv3;8>FnW1I9A*7<7d&*)*(F&!- z)l(#VY{b|4&d}q`T`@I?9;vNyq(fx!BPnNy{Ynh$?V65$#8(a%>+^B-%I(j`8FR<; zJ>0Q~IaCg%V0n*d zz0GJ@r;8dTjv%_*z0bIh;M8Oxx8t3Dw6rEP9ZW!@~U6^vK9J`1dOi|U&i|HiO+HT zE|KyIZ#177HugDseD(qYXSIuO`rGI9CnS>|i^)AAKMfS$SthI{yG?m)ygk3W@w4f~ zYuvV4WHHGZ5&o2(5=R$Ne!r*jYY+=Hi;)fTeMqpPb_NDAQemcQ+^&ABoh94n&BI;6 z2jBA0*5sn-_n+Q7I@q18cZH%w^xRuc!<4r4sYM1 zR!iFp?}Zf=4jDpEX^=g>NEO+O%Sj&TFe58`fXhl5Zh>%0w|ldztGIyC21l9S?Svh1M$6 z&7BiMxP&;`+uJ#(BN2W$n0q1@$p#lXQ_5UsfAU8&&e@eyYl8O3=UFl47#4J7bHCL<#tgUs&tWxc*lQs+ z9w?0sB4lBX6c6U{xQwxT`!e%m-yY;Q&fQAuVP30&rElduL!%UK6OJ-WHbiU&{MJL) z2R~;>1*@&3Uq{L_;2d%cWIcUH>JnQSt4=7TSBEvAB8uMSvxWJhIY%*(d;D;3Htc>? zUOZaA{`+T_Iy@Dykl(0Pg7SS1H$R$R_k>-!UcpqEp-zEDbYNB*L})kaXBomgu`;Y%9dlR zKZvTiiHAz(G4G8A*qwD1`kUv+26CLGJMXte(nZp{;#*_9>!n3D(1hctrwV&)<>#gp zJR+-5zV)liH9Xu6BOeoyjfZjP$_h!{VyaK$-S^L)oV&!VY0yp#ZlOf>PPW-_7j2o7 zt^aILWS_X2;0iMG-U@ruVHrYySHWi5>t`~jnLO-|j48fPaaRy;FTR%wCNg}uoc&lY zS1GxJy-7Hvq)L}j>i#g(9S!WYu}Y!+xv2iFjY_3hten_%S+ z_53{8T^$C4E*(N5uPWO$={8+#ThO8@Z-*fnChm0m2xaUhYRkJ>dUuVn)`zA>mUhqK z(M5~jd9T7?$Zp(d5WPFxb?DbYTVl9)z-Z{R>@dr@A07FaR2%Ef*LEYYs6^mtbNa9rTfFdh$9ScWWGo5O?WG8D(dh4rF>7u{BmFpTuV4w$M(0&-Gr1`#D+N9Mq;d62{ zHhM?(Je3t52CeB8`gE3#L0rBP1Ia1VJnhmHfhXdm8eG-`qP9n6##J`D3oL4scZksy z6b&P6u|{jx>sGO@J_`!{Y$&lpOvdBZ&XhYccvChJiHN=Yp4KH~QSfW4M=19rf5G%z zuU|hN{(N_V-J;xTC7-%ZUh}@#&hSC++`+1VXr@fq!bRD_>wH@8#`rJZ8$?HEmas8!c;#AEY1c7ie{_8GYxUJ0 z`0D(%t6b(UgDZr<4MmlH45Oe(60bm_`(QjZSph5g@<#}X|D5IW&GR=_ZhOeI!1OE? zs4rTtybqx8&Z8uc+Ugeip4HgyIfO~mUb@o~OuYK;S?5KipbWz>*h(e~@4*93);QkF?pW&=v^0MJbM!n_z&Xb|f0aGpfw6t{BKjG`)O8=!@s20VMwQveqfzb}inzkPE4*8p;mKHfL@?vmZbhZo`< zRVkH;G%q0M&3OF>mS)XD2G07);xYCPgo*snan`$;;8b@$TO#1HWuUHe&V1Xp>uPbe z)*XqIi`h+msdQunNxET5%3Y`(VT8+Qc7=%N+$3gajl;(-CV$e!v>9{+&T}Gk=M0&g z+k(ZcTsIDwQoVk}f8EYtXTZDFOoh`7$c(>YQe>vJc2=4RurWL0(OP9(74BTV7g+Y5 zZQiodlt=5e1FS2SPUo6lCeouBQ_a9uxX8(N?b|x}^AP8cA!`4SE2Syoo5rQuGZy6k zkZlc(FX>_^Y4$(xEdB|=^R0EX1OSkK53XaJKL0Ps#od+$On6#lXxMoi)8)VWxu zih6;Yt+ec?AJi!|dc$T|XVE_Q>iy+HorvWJ_LS-!ts$fkWwci`~f(lIh3TjJ*01!Z+o< zlAo)Ur;@%D#E9ni4#NWd{zQ%A(XXGWB9E%%xh+25`T8NSD}jflsKTuFigB##%cHM# zSB%*v`4Pfv)v>Y`GjhK7X}K{aFuH_x6>@5wxxE~#BeFg;hTXNvwKh`B$~ zudNfSy6wZlz*cO$tNPOTqwjCxbS^WJQ=?x^=~OlzawkwRMY zrsk5(HT0Ap2hyss6H#bAj4Vr0HhQaow?h`b%;y9t@^OWEmc=J`o0kLO|DtpY)yXrfuW0!+EDZ6!Ot z)YNon2u|Vn)E6o&#n3V{v=Hf9%(Ib+k4RiZuZbE&KVtSPYlGga8PHoT8#=rwMUEA- zGA~{=)}7!#>%JncYWuif_*&wO&GKwbd;Xru)%4q{=a|Z)9a}Z~Z|(GX<+oS;TCZPy zF@0+*>O6phaNQL=+)9g!JfCtzEQ2@aF{PO|1I0@=V_HJ`TSUi@xvyx8v&-Z@<{qbw zy~F&3VHWgzyvjEoZ+0+UR+C@9{*(Jdsq?+Gh|WGq(JK;_N;Iu;u7jKsS|7|(quCF+@zIv6_Jg@(aIzdQyZ(M zykU0L_$^m%iwUMFnenonL6i3pK|mIomEkvan=^9(zCK9Pa88A*xwi+Jv@#6J*{Z|c zW0*Djl7Fhk;*Un&P6PAAsfx?7V1(0ULgQLRm&3Ouas~|_>W3|Ss`;*^lQExDPcfoPR-20t|mcXy`?1qPU-~88_8BBHa&=$yOq?;XKX#?+-E!2Eks_ z8Vwd`W?rW)yV?9Q?}m1;1xMrcl_J{U1c65H3uRQzTy3#;gV*Vsogsqd90qeTPW@oX zX~pIU0u)#1R=R>(5t<9)(JQ$yMB;;NKhR;` zh~I5kU}za<#Nj|sK?O@Uh8drm`d{4oA{~0o(mzkvf1vB0ZhvN~Md_T0kjaPVOZd{a zFldv+>quqLT;E-yK3M6HoNv`77AIrV;lj?v|A7tEj{_Z3)h>W-pGG|EL+94J?$?RdV`439Qc*(Rfkrv;+-9-kNzvYF9HGDl{;VB;Z`2Sx6+C$VNKa;IX~kBX;ry zqLsS&a_|_^`l3ElTaLPxlr2NRVcJd9z`?GUH)bJ%p78#)M#^pR>LdB1qz7Y`=gC}D zD5*bVASrPKU`!%b@sN*w4UxQd6MMkF=u>S2{s4aQXr-_;M;^szqT&XKQEcIcuEU1I z@a%zVT#pn1=Y_Mx1{?c}sX|*t;3?leJ`28yjLW?9E<{+fA$%wbrCXnz63y=^&K*@A zDzcCSoQ>e-GuXnf+&4{{tbUeE0mmq_u2g_M3=HVQ-4y}WPjrBSqUe{CqMr*l9By^U zkb7j!z6V#G5B-U3xaE%}{SFAbH~Q6fVn;jbl1S-`7~+&1&=0@#94d?tA-+V6_OLm*5_iH*Qnj)pWeeUaZh~^kbaDYp1tJx16nRDIvF3Wv<)1J-%P4sdqZsn_HN_%a0@!?eh+S5bW zjaL=ZR6Xu2dGli|mQ}yqPyOq+(Q-f^Q`Ppy3=%ciG%}&l)AU#2WFE8jXrP7%Bkt!W zKOg~S2{!KhZI;a#ZKDXTYG7RjuDU}UVxruP;0yhfh*lI1ACw<61Ia}mGJcq1Gvv1B zci*@}vwih`QpC!8fgos@lu^E@{Qk@n?4+H~6iGGjeGX?S@1$K`3u>`<>rbmv6SWS211phN=7)7KS%I{;r*O&R^FDUauGW@ z+`cUIEu7{4on>RM-NDkPj{iJ~RAx@G`5fw_*^gB>jk(qchC)ZCT}tK_tsfc^L5Wj4%1>>N zSaQw9q_)3CAWR$Y`?aTH+8G?w-6yu^8g!S>VbRY(M%nVA`Ew{7sW zbkdSj?sph9aOn_rQ}PVx%UW#CJuxK}eTJ9o#+l_g%_F3oM7KM+x-S?KJnG^Z_5_Am zz7~=#^HWT0Egl_bU{^l^qjJ;bMg-qYm7Gf$1h?;uRam}x^z#8*;&3T};ZuiCQ~?AA zH#Ior7a+?4^u8kyaOtLfOkt4y7<2qcmPt+F1X(aq{5!b?J-$9ag`}n+@|Z07L^>(D zEUA1UJg{Linc$LmvkzkITAEM-;S+05enUTpZh^&ycBW| z&VKx*96=HTb|@9fvD z0)U}+Q7fS@ap4QBCAleG@;d*M-{E50{&kJUm0fFj?_ALZ(;5TaU5O3>1*xXDPG&S@ zz|v5lPw+P#XrS}e$rSuV?}%kp zoIGeL6>}%Al;FX^NNE1r5?uda&FbAJm&v5oS;&lygTYOkXUut%87e5RJ-K@CazKZ= z3xs%F_SxnsHVr_Nm`Fn=G48VFT*$Q=;HDCnERVFj50-N?DMXUn-bqgJ=cY4n(XWYi zby8=EQ$9wz=&W1jCYy(@e2y`w8`hasWhuZV;L*&2m^8jLKHx=`dH*&zuls5we0E7c zf=U5Xy}*<_GQP3;*?RxUC(_l2m;CN2i~FI2or_BVtDL}b_ZHZzB9&3cStF167-0kp ztzGMjtMpH}yiyp%N@46rP-9=l0&@rC_|0Y-L=$+aw3|wfU{A6blTXB#>hs z{kWD9d{sqbS<+L7+o>m=EssAX8kovfKlYt%J$f~-UefvK+iRIx4@8GbwcX^6d#x7k z2~m<$BU^1YhEWf|wE{ul)5kR$j_~8hzoR<%WQuO9^~`e(bRcL^arcC6%5lXv-Qt9h zN8m3@8xO43dSnYV5^cvTEHgD{9cNq38WlTGrUb0w-txlD)G>08d%SO%wxk1Evsne& zBnFq=P!@o0v)JU^+VmQg{=5};)mbMz{i(wACVm!pI(*uzRd;=)QuD<=bwONwow zcJ>q``r}gamT)N5I^%joC0>Fv|KQ7w2;Z~ij*?S*BPS=?JP~{+GLKLGX4H$Q?)Z`3 zzto|FAwQ>hy$+Y|_cfHbNF5DDNxn?l(>rehc}d(PDn)Y&Kk;q?{KTDn5%~{(h5`IM zJRk@;eX1-HaImBcm;9-`07neW+UBY{_bDw2k8zmA>+NF1JjKC>FvTsU%Dot;I9L+a zyu$xULwq}G{@etYk%eV-urSV$(Hj(G5nkad{kIM-W$c-;_x6+AkdqBI#>xGQYjDqMj>DD{zM^rp|t<|DCDtyMt{C6 z;&i<5FdPo;@g80!`+F_Ub1GEu@qn56H24TdLSN*T%v^wl`!l!CP{GGYejf6_o6NM* zrN{N+o(}pIP-O()&CS3&oqajbRm43tl9oB0eG^%j{b$KR@~5*8zTM8?|9(R>ZaIXaA~AJ+`^9b{U2hgXTI?PkTaVCH-&+ZF~^|tJM0u*u-jJu%8I1E1%06=LuKHT zeLeXX<~(z4e9nL;jU>I_L~eoRCy8?>Sc1ClD&4<9raWU3rJKdYu<&h0d`T5L9LUO$ze(yim&aZUaow9S!e))Mry3%jrZ8# z%DLWs1J~1Za`b)o5abacaG0V60R9Rh5!?u(8!$3rAQf0VuetJ6ya?lyU;Ro!AqkHa zx77fn%xgM@*d&)eIe_Pj5I3#Tw(j2Te0jrXYzvhr%*dPta37*^@SP@1*aW#cRGb*K zH>hnaC8LJ|riYZxHXxnI$49)Tb^xd$3Nn>(`=+Dy`tNoG{hrFe3E%HZs08GpQK-e* zKGq1nS6OsFix#5Pd7zVt%~T^$(YyF-*j_<&(%u-f!6+ocgINv8sOey(uztO+P}Lg( zvaK(IE=wB_@M`C&P_;{P)0j=vfQ;d5t5j_+$^kflY3)AC9VAY96Pa^6z6=uEQOcsD zn_sdH=h~unr!TNKaC{X_(mooG|EP3C^_yz*XNAuJ7Q@zv_%oJ~T;gm0m z+3!m#GO<2bbzV$%V>Yq>Nan`=Ut;x>wQ;2M)k`LM zd<o_lC?Sb|}Y#Ob)zzHE0wffWqe0dwD4mV#fr$N}fKo!LL+RTGiRIE61Zx?p6xUH}c+ycNWh2=_! z&&XXq-_+w$>y-JFwqB< zk4`pe(bfoP*l$fo)5$TgCc?#dwUQsNIp01xK5`qg%&pL#_tvbu_c3%3){>xQJhtfG z3TiK*cq_1_c=ZP;7@7{}*})bvv#|7!vdQ}qR6g)iEOFZGT{71HsbI~RG-2OP0SyjfMj)yQn)MJ!!`_W?7%kzQhSo4Zj(j3;S36}Dib2x{+hX|1HL~K>m78J;(Rt^+${vP0&2|fKcWO{5 zIX^nfhTgP0r0+KA8t2K+nq_6>0CCK?d7`a(chdfMpOf+1uiBcTxfU_*eE96c6Yuu+ zEb*1^Dtv4ec9VL|E)Bu-7}=#mx9#heb70EG+ENeFFr_>KKxAiVmC=o^#Yf2a!0KiS z*l$wIr{7xz&(q4T*)sTo| zZSfp@HxKg3%=?Bt+1YPUb6~zYTx$G%>P_WTf#gR9g|6^b-4l6>mi~qqv8?^vfh0Yh z!&T#x0}z8Ts-`44&Xxe+j*{6{TiE|Bf$g=F9-ww1M`X2F7dwWA4qHxdH5AL^p5y)#ZLvFkboE% zhd>rZ#3=daW9N^PB<%qI)#0&#+PWgJb!*fRd4nP!REWtX6wzG2eRN*J66}r-jaJzH zLYtWLoV&?-g1?K)(p#w>A1gxF*^oZbe4vy4&43!#2E`4Nr=gM&g;|81kP)?%zs@7! z*Ms8Wa;7VGJlg2uYF>8rac2dlD%dJDrqOp21m%9Hcqx#*R9%QT-brK44w_RKS4h8v z)u#~UkdV^OgMLe3~I zaHlWpk)K_Xb3<`XC1^jA1-@iWrUha5lPmMoInB2hDH2EKZPbG@ttdRn(jzN+futX= zOZ)ypU(uSNM+J4!8p%T8j~iM04)l{XF*S~txl!aPH$tn<@qjggvMi1?6r$p*nJlVvqCQSO@yr2v>WHCk@q1=1c5B^54gy<~ z&jSguiHcR=mh}U?S9OD5S$2HL-(~DnYPV9CwW97pVVaAmDab(N(Q)4xkZMuE7w=NR zPWBxVT!bj8_{`Q9Fa(RY$j=^ETMsLJ^vEl!l3DtMN7m{%pekc|VG;fOH5Jf55xbfb z^#)SK>*H{in<=Ui7!JA6xX2hr{gF#uq|l{ZL05z9ckv(=1hvK2u#*QK~U7_c^&VT z`n1VK#$|>S3eIOiFrCf)C5d@41CRJ89lxDHZG`8%xdRo46pW=i&Pcl;4_070uYCNK z6$IgR+Gk^uB8l*|P_e_@B#%%cQ?3leV^-4X&0Y>U z9utlqv%3u~!v=Pi`(0^E=@(t3OFV^!^-L%Cbnn>eg|l+xMs;Dvun^0tp2+j>ZUgwF z^%LJKcWhCkeS%SWbmn?Tx_~hGC`$Lh*Iq4?} z#+1NA1z6vxSkDhr`l|9F_fU%L;1`hh0&gD(?*9NFGW^W9Qv}DqqGq+Eo+z@bP*~}D zvRzr5ajt+2mk;?Ago$mmcT!1ZF1qGqn}?tP3O)f-Bi`r3Y9%2q(WHzm*Q;^&;-{(# z15MYS@+98n8O)vaapm}ka^6}5vT3$hK=>5}6P;=F8;B<(u0HHr!H7A$ih|IzvEscK z(0ggKuUIAL-*EgYd2}Jgqez2_Gx3U5RR0H+RhbiTiF;$#rOT1uZdozXhOJzrd^RTg zRdR{|Pu%eN#+)B26TUY*A;Ih;tADlZz`39{Kh~iskWV`OYK!oLaMWf zcw`cKM&-c3M&&>fiB>m>h1J93`+j+6GIIaoZ{X26+VqfRn$g-ONq4PFQ+UsXOt;85J;(5fdhl#fJf}s5 z-Nww@_~k5=9G?UE&3TqU!s{I-!>6bygr0J*MpDVo-q=o1PHS!}k2w_R`^pD8_SWTE z^?QxiwW}=FvK+VWw-ga6UaYJ&AMn3)_A1!q%HYcxvP{TM&7FdqLOID~^Gg18e98h9umg0|7OFXU!y5!|c-u1{oLGV}8phUb*$ZbA?4SmD-g4LFR zyijhj%@6pM*OHih&H3tGmNPyHJSfO9`EnJ3BTIK@l<2%kp1KhGNjbiU1e&Y2O2clD zFM`yCF$|$O&&p(^C|1oKoMU`5K`rt^HpQJf31zW2bK3FoT*(LYpuC&<25OXjvvAVk z*Y{*51q*EWCSCgPg^AFgNK;`kGoF`CB;9Ersl9wGdnrW4d$Ex{@HM1%3ZqTKCGyo( zxA;h!_4geTY*r`htCe_$2TcJhrS7gO+$RBmh&A$}VBUNXOUdVW5A;tG_`gZ% z>&~-%CVAzp(|ZIG#bOGA-@B4TtxWRzyX}MZriJX1Fw=$tv32QaeFa&F@C#%|!!b3c9WvNXFV(i6?iJyyaciKY8qNjJ4fx2a7C&WLO4Sy3 z`#o?HPu3PjEeRa-4#-@kvrSlGrm-av3cR6Ci+=^u6+jX>mV{RLk@U?j`A;4bp&(Py z9*e%;`NfqzW3uZ`KPTO)A$BZw@*1p&T^Y8NjCZzi@*?-zQJwTCwX7XL3+$ACC*Nzb zgUUYw2&4(+f2WIx%^Mp@*JJ^5g`h1_w z@&_-s!}5>)L%c6mVy5w;OJJp~gJySqM5#X*ZH1fClQr2lCvGRga=C(w%!cK>(zCd_ z9&^wV_P)805YRtXSklAn#@vl7cR8NEWw%#$z^aIM(<0_U94kf0M`3i+g!Oj8NB6DR z=E7@zZ1(vh`LVZjcO4tey+(jf=Ei)v8xxf$+--PWO|d^nt;5kF*~bIf&-4ypH5xkZ ztIiOG;PeNGR7K;JR54q(4ccc1kqT^bZ$9ho0%$ROZK9FK?5kJUj78ojb3rYL5yIw} zdp{G#2G)%9KJ-qDvHA%t3yY_@AOv${QVn)L-Rxb+GO+JZLkPVDNt*o{{}a{}o_ z`xM97YxJmjdM2)MEfn$V3HYg-@is^mV*lVy9E_K~-UjgscPfu~S+jZ~B>Q6*9%Jn{ z#^bLj@uF~pDITm z)S}gud|zoGdw!7xNg2+Kh_!W8`H3T8SQG-L_xg=33Cb%7h(VLy%?u2IPQGxo1{KKk zdgoZ$8Vnv?k|A@A9=%tn*cd8C{KBRJxG|lZ&1Iwf?_Crycy0_dUDc_*F@RJ#ITy@; zA^FUgNDh)EcWoy%9SZCmKig}R*WQJ=N>I8Rw;Y%~(6uJ=itsc2UZNbxBA3}0OCMC~ zxxRL~UPa_hMr08{HG#uUugq#%4VA>RC32EUrS$hv$zJ(6PF*9*OEm*Ddh+(sBrpgg zIIl*aK!sv27Xy9Z_;t29hP#w_bwCIyC}DDM$8&=IO-6=f`F=r$o@;neN%BSk)d~<1 zUuA&i@%B1Ml!i99K87|YiYE)YKHOQtwY?f~8KCMl^j}r{l9%s3JxlE?_%8X0#UDb* zPYn}_D45?e#xeK`w!e8|^Y<_w>M(V49x)&Kz}k2Jj2XP%D+5f0&v73=1r7@rz{~3 zV*rqV0>1A5m0M-V`Hs|B{J5ZYv-uGMtOrDrTa89mFNo1cUd8{RNJ90r=FKk)XTzNrc(|-9N|q0Sha(Y_|4W1) zEBt2YtS%PlAOQX;yg2+jd>Sa07BH~Me60ce5*PgZ;@@8mk;2Zv0(N63RR1{wR2_)O zY#cXY87fctS2RCgAS%xy6U=|JuP8}~Z#7Uv4fArg|E{8>1d*f#FNX+YFa=cZ_Ww-H$y?HN zMb&UY3=3saUo`y(@a+*m5q=-9wukJ@Y%%@V-=RCCnTaQ5ps<6``505a>oqM0h>Ubr z{Qruq{m?LgJB|0K0rs8@M2F~~6!Eq2Ap?-eXHV{2t>s4j?)TJ+FQKOC1^w2Smr)nq zsAsZ^1Cu=0DrKxh`A!(=f??|jd`A4=47J0Y{eSlyW@(uk*VQ4g zU3Ng~g3e|SC`Jh8ex18S^6m9Ua^UyIpvq{jIEin<;XP!e(@{~IIutGv$6%8Qx_nN% z$;|J$w*m1;Z8J%b)lWzoz7+L(Sj+PhgeM?@i5~?a7)mhdv-c$+)ovfS4Kcyc$QyHa5&Wz94#X=q%F%2^m&UHiLi%WX1x3yzCk_TY>o* z_t0;D4{;*}WE0h_!b?4%Xdr=Pj+IbH^Yt3AeQ#1dx8!PLC?IDTZ#VHjsE>%C+GG@* z%`ecURay2g)UB3SPc?X~j1MfTB`6gK{Ep61tK*OcCs1lI&e(hZ6HS7c2HEt^gjt;7 zvrD88fHKi4G0-(erB7MCrks035;hN@baP(Va;EJ~y}I2WoBhr}CWg&eGO)B^ zD=4XU^1*mlo64v6pzMMabU?O3Tq97K_zX$|R`;l~o#rE+0wtO@1t|cPb)^y;dG^Uec& z)LY>iJHcY|#?yS{3=4`~VYs~pJc>*K_F|sba(3Jl=*+NU)Prsv2fNOK(@ht_SF+6( zwg^(VRd8<266jvCt$Ihgs@3Z^zC#E7JBlouP=bNO`$>+{a1#wEeI>3fKVY1Hf-UOM zmwet$QK$vQzW+A=fMlpXwpzLs%w9|ed4aC$lvQCd6dRiu5tcb~S<|J^wx?^T7(${P z7&>}o=1%p%AD%C(vG6;iSl43c$#!o9nzysEKG`2@^m?=%9+O+2Q_d?%ed;8RaWOo2 z*P%r70CFeUDV~`?ee=epm@_Nc6MChxD3`dLoyuMdQR&oOkT)s$s#M3@sgxqDYkUGU zhNWwtT+gnGNxiw5`i1uRdKKr&JeRdK9(zKwymCFKd6##~+)aCc4Xw>@@W6A`t!E%k z`rR=w#ZSMrwo#C9nm*rww6-~$?fg@LN4$X4rwvA(vR9)kDzt-k*oQ*YcZ`7f)(nf4 zPtGr@usyKPAX0|IUAZ+0RJ+9!Mx z^qR_T5|)YT?F1{mQH1F4r(*buf3hH<)jK@PbU}2gLPaU!LM8X+QitW#px% z&UrU&lo0Ljy8u#&*$nc|nnZawqo2<*bC`6|6Y=!_yM&tUQ3@vR%^$g9M{@cUE_VXD zdASaN6I*ZmwazkpbMs8>x+=#bu}8ZrbYbmb^qi|M<{c>>3s<+b0)FyZ4}Alx)_+hY za8Egrm9`I(D6aYv=9g;KxXbfGND{uNpJUCnl4obl^-;{_`2aEp)KH@#w*W}bE+coDX*0k7bAkSPn~TI4UQC_()p@2G-pxiZpM)WC z55r>dc>HsOzK1a6S}Jsv5cWNNJmr%7WcK}XPC$`rpf|VSbNACct9Y6YB0^t76CWOJ%Tk?UL5rOgu9B3Wgqnm{{I2kpRmHNDY+_I!g1 zgLHSjJ4cIRCzhe5>PboOCS6PvN~$zs)@S+zn9O;!p3bLOMY3Ca+b4F9Ap=jl=zfbb zsN69>h|K8|6{voks5f1ktj4Gu^5aE3hm;T=_5~`Bq}c1fabjDuy<+aFo8S6!`x2C_ ztF{E4OkX&GEQ*t+5V)DkWP*$hJ&;jIL5Y=|_Z@QZN)x*2Kh zyJ4_zLtrs!863!vQ(m({&L2Cq^i6?+qQ7R zPpVD$*4$~KR=J3Av|@Ybr@m;yVu!j)`ODDY_=i`Yger={OBpUI8@BC&b7sLS5vM5m zkh3k@0ZPh0n@N}fhmda_6tr!biMPI*cfP#Ki7dBtfpUMn(#~xG$X2}&)+^#3-6{;1 zsjtxP_6~*J#k!`sqHSnLb)BAWFr@#>bv&bGy}9H+sxdW%c^|gd%ZD-BM5ob#Jtmms zN{iliOWWZ6I~G4>>qFs0QonEiL`|x?Xu|V$%_maJLHD@&P%CGvtxTSc1hlj~rBFQ# zN-AhM6jO693p(4uYZ*HAgtbkW6c-DkK%V-i51!OGWu&XopdP)=zb^LukPLE zi+;w%Cr?iMh4$E(8B|?Wa$1WDin12hgcxUcfQ;6Pwh7+ekX1i=_Ulpxi&hV$wZLC6 znE@^vx=Y=?9v+C#u#!iRZN0n?f&jN5f;|=a{?VWDSWucRvw%uJNqqWA);7Dbo5gM&HQA$p?>{? z;*#5MfNXOuEE49L^e;%`6R2NM)5uTjpLHoq&I~T+(OkC&i9*tj0k$Bw`-kVa-Q#Kr z5179|qUevqyMqDAvB6?}H_#W zZ6*@!8$F;uEX-nxcWqzWKz-H_*2fUixP4w$=cGnvq)OryyT*O@5A-Wy>WK`<6#4}n^qpO+6RiY|0gBy5 zPYr$t>2v2d?J+2^x=_H+g?4qjx(9gtiJ0wOHk<_GB`=qz&Uz87=afsq>twV`jYQVW zKMNZS5xJg|r{Z$Z?Z}}c8h6oi{D-n|Kr~w87+SEUN_y80Jy8OoE}q#`ta2cysxTGu zMHj84?!ez5)?Ep80w|>L>;OWg1k3urrlq9l9=UzJQUc1EQJYpA-c#c|OTufz4}mlq zZ4Tz?oLx74G1~TOJ3Wtz0Fy8%}3gK?1Ic7Sv(5} z{out8P?_j1f~29eGvG+FJo|g`;K|2DwX?n1Z-0Z{lI@;v1og|-93B>3j#WoMqM&O*(k`fem8|C%zI1Z+ToZQRfHwzx zOYH*!DvXuq5BcGQ=?UijJXB@E=QF}jwBvslJk2p|z-vOFMs^uSattEFa~H2T z{209tuZj`y!JTS-BJPhxsKo!}DI_|6ygg6R@Z}jP%8-Cy#uQAYVV%pS#9Q%6epb*A zFUzn?7j(~@5vIu&eTQ10Q2NO4=BTnXo~N1#MLlPuvT(zPQL^KcFW5dyy_o^;7Alr+ z9*0q+7>J`P@NQJiK-2DZ5)HxvUd6CDtGMle_Xy+=q(Tphe%#Q>MIatYiIX2jGpX0P zuJSrB+}3RYbwWSreoC47cK6m>ac7oo1EgxJULk}tJCP_=p(O6-)Q0Y4A$Xa|w!@x7 z;L3qPdwW8@&sY?~MI==;BvAs{8A5b_>}4C=!5ooGAKrUN@sRI+A~z-MlOm!P+Eig` zn&8Kuv80b>P)f=Z7vo)aAFESk_^%Kir{#(Zbp4<34kx;o%o0o!>A zovh`~x@8T#Tq(ZlxnlLhyyr!?s?xE{7|MuBt$s{}&@}fKHU=t+&^PyYwlOuU6XB5# zsvu!=_)?|K((Zr?+pt);8Hv!v{KV@L6<~DLx-B7hMDjbTayWSH3GLiZo@OpgG?e=E zIY0WO2RkO}O(M6NX{OYvf*8g>+uGnY>jX1Ix_?7Wmt5(GGQ1On@V&qb*)Z$D7)w^v z<+pQwsj=dbsy<=3b6s+XI&m}0H4Jrok>!{gt*`37_YEA=iIJ3dE}$D`GO4;QMXong zOPSAI^!M$y<=|T(Nn|oS$Bw!{;d_|-@C;ngke*HksZlS)1)}TW;X!D;KIxh49C**9 z(x7y`48PLOCdcJQgA3GxJ>_-4v&Ud#KVZHTYfJh`x@i~m+`Ux^4A4@b zuu&ZpbUy5(+bsDIhSuYbFChdT=K$H6YRc7t=VckeVSvC*hLPklD1Vjb+H*#jwU0~{ zRQ5V}I_2geI|cAilo_|jydrdiSN&lZp+f1q0de14ZQ6UrVVE0Gj-F{FEu;6*$d~}- z4#HD??TVqIMF_TKyqG@sv=;1Ex9?MzNVplb8ceMWuV*`LKU#qC)Mc~gyaLP5`S@_( z=&U;e1s{C}k#p~tS6m7;uW*{mzTRR`Uo~NhNu0jN7mC*76c}|AY0BU<+kmx!WJ2){ zg_tir_>;d+1KCnfun(!~-6s>1!X})RKN@^QoMD7^8thFB(yL*=p7V!dMR6yLPXVOD z?yn3FR;F_BhBYJeD+Atq8&%ST3Huf^qCIcxd;gnbI^|!+gaxIwEgLd&&v=s_T9PSr z_M=fTohMTevE7xqf0|}u6vn6u5UhK?t^pG7N)3lxcQ$8QC@1-Y*WO`DwuF>(54?_E zQgV&V)>GKRBV?ZtZ~G@aXG5qu&c5&*@)wLHpJZw&?$_gdl;O^n`QI&WVYpYdq=&bD zI`fAKK;0Pj=mdYMtQtrm|N2ghXh0}wHI^6uJ{eegDPZYYA_xAv3;{ZHVn#cX({fNW zcw-5$^zhn*|Dc9A0F<*qiLIyi_4U<8B@L+MME>*$+CZrSK*#Uv|I*%j$7A`2@59{P zHf1IwS&^BHNXAVlo7-L`ku95~+=^_OWhZ;@%#=!!>@AyQR%C>d-+5_#p4aow?|J@v ze$VUc53kSt$#q@t`&#FD9_Mi!XU>^_Vf_Eua#)SM3VgEZ{v9kTtOomikFR;e83iLk#vwBgP-H+XteL3oYJ+`e0%e-rEd6Rp( z2YF#2cWzJw`SV#vt1zI4wjhlc^n36Bx0=f;4<9Ct?OrJN@JE=s2HN` zlJqYUX7RofIk*N{)CsbFzhZz1EMT&Q0KBWO$b2+zGtJI}@l&tO5Xe{&ZCptbSAPVD zFl$G8aU}VrzCh6DAeWPJVZ7lx)cDiB>YcBFnqU>@*qfys{#3)pfjJugOtr1FCeEsOcT2+f_>tnubE~ zD=_QU+ggGYYF!ivo6ie3wfG0M|2|-I2A6SS0v-UQvCE_G!qoENZdB|w~ z9f0zfKG$E$GhQ7b&a=Vf;AZhK8b8wWpuGy;UZKe-ymuW4fI|q+6gmuImLFeBe{1D1 zzAo08(s@A!)MP8;^N)zd1ryJvrnKTLw@w@X&TIrx^{?bgdG!iJou`_BHoJKi$wCS3RGzuvi-fdq1ILi{J8;3NmnCPBl6XM) z&G<0*=t(i~-`0zpLE6+VJ&31Z(XO5U=3O$uV`m)_CJ@jWh!=1V=?|t*X*NfMc@x#q zce%`3oM4zrqdL$B3@c%N2qJVtDJ;TLc<5wW9%?_R{#Yu#6D+W%UkC9GUb+c4MA=;4>kveO>GgZsZkH+F-ZC<5Pw*}U{_L)E6bU>g7=B`# zw{v^nCm&y=yOp`Qek$AG&MCnD8lbT}YOr3zGExJqJw<`2i$`yl-=!<`aAiLfdQ$lg za>Hy<4||RxQl@LAKTA%2zu>ZWRqWgFt*7_mVVz_jOCq?i1ZFm=QLVU39yA9@84gp6 z29N`+W8%nx^$L9Coi5W?3z3^6mDb5M0L!+;3(PEaA1CyLt2g4B%-_N3XQ!}MXV#S)e}C;_9b;(o5ism zp+tP+5`3-q`7ATo54}=UUp~0QDS1%e-nq+vgMQU1FGuL)7=Snr-gHOKeT)J~OGo>Y zr0!-Q{pId^(MARyVn7MUexpB0?qsT6TlB7o$AV@mzZC}#6KlcbWjO|vvhK_sp`n{K#{IF8(K{63vUU+H3-$`o4~5=tJd{P+nWyc7K~#Qk~N z7h-k%Md@5QBt4c-o5+BEJ+|{`qO9K?_(o5Y<<_0qR6m)m*SbuUhhx=|jj6pY51PpS ztyIGxC_OU#EhNSABv}BHf$*z5edMOi+ro4G+o?T?aYzB(da*QHH2$=Fj>qqagfT=@ zOEO)w#H7FpWt6J=BV{3egpnVwb$$}m>l4m#NPb#5^WaS5`FE3)xcI~iAN6l5d~t}KV_KQy|8`8A z3SoM|42Sn`t0oEv<>LLP{tMIc+z_V!x65&6F!*mj{*$*s&3k)yqns?jQc!yeQZ4qX z{+U{re9^zHJG6Q_1Oq$Qmk%|&9dGrdMZXwMiplpVk8A6Az+@oE{uiY1@kTDoHrg+s05fdqN$MS~xrU%2yS5hB-BpC%7vk{=NRh@wH%^gTB7mF8i! zMFAy9u)HG1JPdJ?UB5H5M^3fB4*~IIq!u1p{i0*>vPC`9_c#yZ8(osJo{gzfN>eL7 zZjUgqaTqD$Dw`hp(1p_*pfMSRqWMU6_p2i)5aCp>D2Op7^E8rlMeYlnX{vNr&wI&^ znjrKx&XULgz^I&43&2gt98{mai{*Zcm5cip+61l7+yYC13I@%kjrIt)oH%K!FqIkg zrcs_b?@D>dz?(=>;0+U>vdhs3Wi}sLsdWl!lyD~NqBk`7fRsS$nk7q(4T02^#Q%O0 ztT2v*8TzW!n%vuv^~kijvYP~>Etx7PNz7prW!NNTM51zGImB6)S{0Q>|Vf=?MG-OAe^#joHwb2SV|EioZ@nn%uamFVqIO)(hg zFF*}zc+nh4o07_Q@LrJi*_aYFU#{=s_O~LbAVOAqbjFeIcP%q2US8AzwT$6idBiMF z35B>OH;2%GBgFa7Z@&%}Go__Oq%IVD?goEPI53To6zcjvedHl$*^|7t8AHZWufitn;~YmQ_{jQVM)sZJ$(IG4I8ed^?m> z-}X1Lc$_AFTE6-!`R@lFfQ3ZRQY6MMkJYUQQ*jJ8F#6=8`Efp`dnFU%>(0g@F?!o< z_ue9hzvGUTTG}|>B*Nm`je??+27j;P4m6q6QpWTQ%m%;?7Q~>TvHr9DZ|dB&|G*+N zN4Qm2-vz~zvoyFAMB{atnk9d9zj8<_mi*{A6l$&1-K54wMk7Ynsa6_ni=aW(_*4%H zu}SY)io=Ex4yAQR)ovH0>FpOh8W{TIKm{mE(}SnF7dt~cV-1dQHLXWoID7^_4TM1B z(0^_$NbzytobtluMyN$0WKoTBi5b%Dq=kd8c@qzP03@=DU*0&s@i^v}DTRv?& zJui>5O!P&KsMv*`c1mIF7A^}vFpr(Q5x5P8*;C-f3w9>1cB4{nlW{1ir@3-OEW8q! zC(l1*&0cZFJX6j)T_+z$7GRpGw00>LuELJMpxNHe3S#YmGz}uNuypH)2>8L2z!BDaq}9 z>N_MmM$upHQf1{GY#)Z%TwnI>~ByP%eHt@P?@jIS85HU%AW1p%Y#XbTJrk)@Mk64ojsu`PLMlnhmw`@0qzMp8*#X~uVB?F%HDylW3}?Y%z}&)i>f zoWt)22Q@rl^;)hdd*3|-Y*=IzB)G>J#W2NSxjbE+eU1KP6I3VATB9%FtUBzkhC*Dt zdLy1(zaH#OI?Fe6JkEK|HR9lyXEn~alLQ6sMxO*jERl*{AHjsd0(Z^F1)nEhybyf1 z`s@yG0M7ovzb*8=LdVjJ<$_ndt=ptwQlB5Hf`i*`M}#WHDu0cVFa~U;Lci3A;y&=1 z*4y7KEUr!hsWIr~8Vh25ShXba8M4~3Ej%;=jn!p#=Dvu+c%7zIwtlZR_`f_}zbDy;j+ zB6O~zq$;U7&#i?|-8>;^DT9Yo zWj!Ogr?D~z>ubbzkB*xAUYt>mRoMpL?E7BmaSjJYo)*x}z5~XJIuw`6fn{%FC)q_w z{0K*mz0NZm7jmCZ+1=P6D?JAjkPUpOnM$y>UTD3~xyHqME%x2JRm(fV@`)BdH>`X? z>+jf;m$$arpjO-obn*2d#2fs;e)}#rtB$CjkY&ot8kV`Ez~e5#aZ(uGhV}*G6?Nl7 z6;B(ABl$Dh(p*>sH29L>lh^H;?fMSv`V{ZGKPIj{20nPT00bn+l1oy01HdKoPUR`( zsVH1{cZ#|I*x(&Cj2Sx)tnOCf}1fOKDq z8`maEde}MKy&;t={@ef3wn|dWpg>poODSRLFMB67Pw-6lN0BU$UUR(CE!6MV5gn0} zUM;o|ELPZclqU-Ju4S8-ls=J+bE;#zZH}0aAA{ddt>|~i(5yo-#Qh3M>uS4H%AN0T zg|}PWe2}IG&=)eVTp{?yA%B*bRuPkP@=$EzO{aQ&-PUd1Hse-PetfT4z8?-LwkD65 z0TMKGb0t*;G2mY>N_xJdJ8V;Taa-9--FC-M6}-+9J(8>L4Dr=PThk&8(hvhbSJ4oQ zPud&Fr^`=iJ)=b>y%lq-PZ}Ihmz6yEJnn;q4&3s|CFBNFnk@!0;u=e~9#7roJAo@$ zoJQB@1GU&elmDTh>71=}33?;b^uQO;Y=z@E-I3had4{SH_FkC)*Ftt0C!fwNuAz6@ ztiB3-@iUbodI?Ey>-iRbQgpxm9hg}9K&&q;=+05D0%V;Z`I{eSM)Y@aaF*s&XM~&R$)-NJmlt@@QY5SVig;~*`j#sv zr+OnQ4X$$jXX?Agx;nY6v-4j$0%;c1HT8lQ%zqb35T91BK+!Uc|F1y#|N7tzD3qKQ|Tc>azoJEmb8PBz&5}{k9G#l^4onb`D0j6UkL9uU~e|JuD6Y2 zoDJH7sS-T1i4%j4mAXY@iZTtKZ@A^5>HEbC2Sr<-3W(-j6F1 zyY{J(IKQrQ2i!b<)inFPsN;(_(q!X7*r6;Wz>TXYim&C1f67bE78QnT@SiHt6=e99 z+rUKpMTJ2b)mK8xwtivOQ6Kfi2NqR?ic4PT<1lmU=#g>E=lS}e^8&sc}LLr=kt8p z0mR!3rV?DQS9USrHE_(j0FEqPhhCcH>ngV$mpeEE`F9sbQa!;+B5aUI=>bczU!=_L zLS~hu&I=!QOS?cR`b$k_UG;o(!MY{+e7VT^Xrod)0&6r7!kxiN#_Gzj$o`mSGB(Ry zubcu!8^0-)SGMr-3BaQlr@o9gSU>N0>_%=PJMH22QCssH)bWfM5 zK02||V%wg2hNjj6RTYTmw!hT3VaU&8y*XDJGOCI(mDVWbgEhpD)Z6PA=zUSk7{ekb zNoeB?Rxq|ba$PELMB>5t47MN{Qe`>=Q*9NBxIjz{N%M8IBUof3?r%VIr{_0}`gmCJ zyD8e@+EN`Yzj*4I8P-=3Zdw69S&!@ibo{Q~n6biA^awu4er(ae{B{H|H9Kzz2;orp zlHxsvp-U90xNtej;Mn|zPj8O7bh}Ii-(&w61aSI1REj{Y7|=KA;bHqu&@p<6Rf7W= zpU?wW@uahkjLr?BLHVN=hr+3Hb7xjs;^X5}VVX|T zWPyHhk|&wCP4`q*tVXZe3he6mUgl~#!?)iSo>+eu7?R{is~}GZavct0kxRt*YSL`S zkE@E!GBDKu?2nAkA@W?vjqh`GtMLU%=l-cS%b(k8=U2+^t@DlrLC5MlRJA>)zrs9; zAU=}f3r&>f=&K|oY`A>xtjudg*8w&Iom#e$_>S{MFcTdvzm}_>T3yhF;D_q*VB z2(C2U&^yUpj~x5f!*kl$I28syME0$K0(JdtQ4rv1Uchewk|2VE8wz&|qI-#j?)KtV z#Y$jjwObCZ8=Pm(dX9N_2KmkA?6W}pdI4F1;NU!*pdv2cD=J>AH8lkhO}v4`YU zWKi>kr>k*gHOJuPu)KFtkHfCH&wlfoMh4c9gE@t4^5l*Aj^tb>diQ6+ojXO~qBhx~ zEsK7}-b9Sp%qyh8c58>_rKm1tFx7xli;CO$tD_|ZHo{kge?l^E4_biQm~KgQC~Sb_ z(VtJ^@<&I#-bG8LmAmBZSA|SNA7#j@x4u-JsB$rdYTc;9GDJAb$%5kfixa-9FaMh> zL;BpqH~_1=T=U`gb&Dt-m_O40gxkoZ zUw2GLQ##wA-WKsO@R^cND@wn#@c@sbRkpgHnFp2NlU0A{>KIjUGE?q?_{|#@<&e@_ zZBB12!7cAa^u7=)dG#Z-Nm`9Z0flI1YeHfIc#I^89SMOkA^*4in9>A~YUuqQ5##Ls zW$YXuZD7T}88L8MmH7uyHucl=_LLilI60YuaL|4HVZAy`gE_BB)mR^D; zg#wN$fC02zIcZUmk&Q_%ZnN&~nm@Ka4>+EFwtDw$VNM!vMxm|;%_ArE;M=(wtY}jj zb99~3MY#sJh@PADy`R`AYlbBj^Hr>8AX|)WDMm@|Ftd@~NbNfgrS7Ho8H>ZI&o> z=jXPm!lfY0D-xl*8RmH4H9QOiOyZCRMZDnbvA}$YHKl%TC)pGE_o6nN1JR zt7B(wuZ_x*_ADk-pBzElh%yQqbo3rLjU|=MiQL+9*zp7ocoIxFV!5@VZ9zjD1YVJF zfbKfi@stM~4`MTjxTA@N&_W(V3mIBM%g(Jy#|UiqV%hFjy4-yVcZ4j=B?_ZI4YtTR zTiIZyZ1~pG0Xp{gXQKp8>?b_Lxp&Bptt)KRM(alHU80f@`d%?7 z&t0wYlxcKZ`>`|QRGQ+Q3)Sx*KCrJmzcqZVW8{Rb*n(>?KuTFBC9jOfyN1$#gQ;)J z5H7EO>d$|b7@`r{fYoqep}v$JheVrNK0V!`S|ki-ljz5J8ttzs7YcnYl>tMZ#;KRILb!S2lLerPx@T;2twaw#bg(=keP%`kVW2*RGG+iB`6r5Vdto zq#Mjp60}TLq6&QI<(I`;G{tmGaZmf4NQl#${&aTI2zExLkZCg;DtC@Izns5Wo$Y&- zR1)tg(x7cC_Ga(0Y}bRZu=h7TQ{7UNyXJkLux4Oe#1etyjARlV84ze!!(BM_-6n4(7Za>Dk_~-X`#^_EiN+2zIE73znirolqK=>$`&K>)LF8O_Cd77LzUCU6bwyeWUnbgoQrAI z7W(DInf24n?{((~IvG-8m|r|};nrs^TA{&5Q)2MoSFj1|Jp>U^hZ?IN{EK%dCWdK4VzR z@T^SDg&F^C!9}dqlGshwe6S|u7y4*=IGLK#p}$)+q4C=!Xnere@6W>go8YMa?`-~U zk-&;!u$Dg!Q1qXLQ5xce1%((W{%-LTj0NQ<)zzL`DQVONmuqK|Ed#` z-n(rWhRa5+J#;ZMGlNE#r1xsNdrRc;2H%};JL~h0;^U1%6^9i`7ihmiI{8SzWN>`E zm}_%$6MW_!9US;8&LyAZXxdO~8L7$?l2%`)nvqMV^*{DlcYr7H)2HhL&XA-0Lgs-2 z_ZtY$TCd}KO{%N@qw}`lltEa1viKmt$#rOd zYjIHA%&K9ng-L*beTAC9^UGMi{X)H?2E8G?r1DgkPJW5{luafitt#H$!jh0SvT(7& z*@zVeuh84OZ_NQ)+J{%=f!KmHtsqTo!vs&}+v6LomL47+w{D#`Fz7o@t=8qfr+!|t zudj-QjRlP&QMl5wn6sFZ!)11{?`AEuVYOcqEIlZ4Dw3s(<<=ZLcW#_}sHf*8%@JD< z(LND@o3RhxZ-~};0Ug!Pf8lFHpIiRKo^$;}6^i-Nubsvb=m?^(GUp;Fy{N?nbaHZS zr7h&8)HDwseqwG)7lvGVt;KP6QY*+`$BxjKs8)PXnU%|wAF&OvNwE}Dk6pL$Ng6x9 z*wV70HuN}?gVLCFCaeGy#{C`6J~hE<*rK8$^5aJ-M0kYY2k^nhK!ut%@GlmKJ(rY1 z+t>GTLRtE3j`flm2BeUb!QUXIzWV)nuH4t4%==_L42d@~w4ane5f#(emah(INM1}7 zs`UuE=3_i$g$~D|Gx%pWZs&iPh0(7iUO(@KHASHqnRdC36n|5CA2nJgbQnL!nz?{s zl)F#l+Hn<0L1G1?mPHoN=tX-b@3*C77r0F$8JQ*uXP@;@J8@T$vNdgx`+qW~$;q{s z)_Bf98C(>;ytud~7`tdz%HYfvxQ%{BmC=)NhGtTG*zGwyR#)zI$)MCUPcZAVnWtkc ztxT=0b9)Q(^18hym=d_z5;>qRAR0mQW;TMs4fWocQ>}~K%c&~=jCAIvGErDvGgR2O`r%eF)`VELnp^%ck5QA{%STS%d1c>9#SDK zo#y#&;%&I&_ihWn7>pCv5E}y?|L3{Oz}yL*a_lnZ2~w2`pi{@vny2RkcRit6r8oE4 z{b6~hn8zx`i$&w>_ZxP06~v91nVB^;;v32es+Iag@d>qxW@>rV=IO%ZltTJV$!YMM zcXV{L5T3I%|NQwg(GeE%JtFtk+mf~2al)OM1{Bsq=jvc8WqvrH%b4M#r{5wt*Qm#B z(#r4-iCuL*9E4ee6OBx>nyC@L`W_rF3&KU%s0*(JuTT*c(h;-#4X0%q5Kij_In4hC z$Eke?^T&w(1>|@LjWB3gj^l4|jB^S9yD_Fo1tKY5Lqz(&B%w{B1xW=C{@6Sl@`3nq zrS88w!?R+(_Aii^Vd2PaP8>FWkBk$JJoEP;#D+W&fvsw&ME~v#!|?XlzdWLdHa#4s zLlZOpT}gWQHS&K6fIg`fGTa#*@pmP0=T%q7+`1Z}@2;{B3X6e(0V9uL@V^8mrR@* z*x{+d`Ss+-k{(OoBr7JX!LE>wX^LhrjuLypZXVc#=(IskZ9-K*CMW52*2&q~8E_?} zXd!DH9UmW`oGeuX*2pe+ZSG|GBKG%1R&>bH#V*k3Actj7U(A<1i4Z+FZ(ZY#CYI1{ z+1%P%@;kn}yZd~5Cal<`2Jr`o9!`7_3*!TP+Uw!K=cg1uP-do_D3!-Vsl8ELPcsnw19(m*Fc>Pii+Bg zF{;RrH6RlqlXs!Y1I>3(+?-leTj>0n}9_J#XU&M=LZN><=b~)U~ zLuHdOOZ&Kk;7aC44~GlI_BP|o}=AzTvN?x*^%S&M?{l7##81;kG5dU6YP%WK#>sJ+y`1| zF$r_<1x}78#R1EdSeei?slCU2vb&N}kFOm$eE5^bD>Ja)kTIzs{qt&5qk)pC_+m!L zJPci0^{A6MjfY1xtE?cW>$w3|#6MQn0Q>EK#C(fMt7QjM{%5m8a3_+l#1YH)R@P5k zuCK301~7eOAtEF+HZf_`+r6XLR?8M|7<};f;mYA1-{PsR?7z6vm#>rS(*Sc6^PivB z8`50=o>yv!U`ybed|p5bF4g9T=!%MppA_5Se;(cYWQIGz_oj2W0&Ax>svUZWPU|*Gmppm$GN3Hv@7)zjpB~OP(N-a_ z8E^rf0AS(|L9*NJ_4pT0>+~zK)BQCPW59nRc)vsU=e)GjPh}MB+@_Uz1#J4uN6tur zYYNyN+rGTK;aZ9~tqO>l`jfw4{~d|KaG3|_=q9{xM|zdBoAXc4?shFc2F=^TID2Db zrg>Oyb_aDLv}N^5pO5_wf1u?0=tAIyu?XQx4SiO!;p| zl<xo}=Sjso)spse$0XO-Zx6Rq;u99I9hW;soWe7u-gPh6uhZ227xk~m zxZ#UAaW2Kh#cdw}&p!Dn*4K?f?({ZgP_?-INfVVBwj!ID3`ltteGf(c> zbMVbV(ibo=Ie8+|VP&`+S{o!ogA@8r*Hf9eClbnQe(;B;EZS;YXR{Q1f9wL;`EhMa zyv|?8d3w3mlNGmuUqf*k;IX|r-5wilzKEKTSZh&Rymjr!Yf>TUppzE&QXnu_S zP7fJ$VSc`LHB`95vexWsW=+Tul%Vapk^93i zlZaxqMI{!Uke0o0Zs6hKqOMo010kB7Zx$+OVEdek28(Fxra;;mnpLG>rLYz?--}nf zb|BC7rI7hSEF^u~*)S02kBW|WX>;sMIk)QtzWPuq6XvK~;v%+jun9OteWNOYGKS*} zl0+|Hdo6t)W?VEuW2u5G!jsQ?mAG~@`GRfpV-;cMeqa0uiU`U#ixEfH4|S>qsCBiw zTlqqDJ6mbhMcmA(b@X#$C6wt-lh4gc%ST{*7`VKt$yJ)D5)cv+!mQZI@o{OOzCf*H zloZ%_RYdyp=LR&pwGS7rosBZsloejgq)rffIh4Y?Cl?W)gKvf-Pd=j<=@^-i^HDu- zaqXv?Cetl}@`S{+5N$VBG&^l@ZMeOSjg76Xwl9$S$Lrjz1N0!vkL&od+YdpynTK4@TPnZ zMEhkA7s$wuA3qMp_0?y>$eY_Y+A-WpX{bICSFC3+#sWq4I6`M^m#h)ADoaatdmV!U zS`%b1Y2F7NVmOt4COtZREgecdIf_RXC(cOgG>flyt7(e-2+X5Ag=O6p)*y0na4-c) zBydHcdFOHXeqo`arxKUA&R2VK8_tD?5)q^k5o$TM+E_KsFiE~IT8U{cWR-sCnWMol znY0_s1SX)L;HBXNW)X-}4a>dI^9)-z;(jw-zjwZN9IMsNe3eI>N^yU2(P3zw+S=#S zscjJTp?W5n9(DB$3;^KIKaQjvWba_~&V1M7(n|N8(baReP(EQ1moYF}QCRv>!HT9vT*Lci_<-NW^Q@y3B3c z_WpgWa!e*CNBZf3L3-h(_r4p_6cgv~c(CbpWrM~c>Bn@;;@$L%SA7WSD!p#yE z_>p*&;{bHjq6jUr|9VDeB$)F%9keLF&}f4G34%sjQD*{y|(eb&*aUo z+39Z?H!_4L1T5|Z2}^f;&FrQUmcG!}Ly6CarskcMA{(DCVfy4=t#qQOo2``+wcB|s z)p5W;cJV^+CsAcp++yNG-nK3w@7<&>8&tUbblk2K*2ir>yj?_B4N{jfSc-!csh zw@xEXp=6DuZEse6z2q{Mb;=hC^5^$IKZd&YJL?+9)afVs{htW7(3KH+1hq0^IhySM?CmZR@6`^kvG5lzW`tHLyZ6c literal 35285 zcmeFZ1yEIM7&Z#q4FZaENOyOG#HPEu5$WzwDUlE)B_yRgq@+UyBm|_TQ5qzqoBM6+ z{Qp05=g!$^* zfXtylz?tYLQi$L`i0&G)5(pK8Bpcv=P+jEo-4PHd$Kn4XLepzAzy;&BT6!LO%1T0y zoE_O7S~#0qviUf=fU6M@gnfj-Pe)6ShZH`J4o>buJ|a}Vt`Gvh;iuWDD1KeyVJ||Z zr>sUH>Fj1n!OO}Fvlq#-5q=XUUaB2+dW9xg)c?B3qqY~I{#&TiK1 zoPvUa>>OO|TwJW+3RZVtCy$3dtWNIKzZ?16j+CYQBR5+Y4_jv^3V6E@&7D0xM5w6X z5Bm4d?|ypNTK)GVC-*~50cnI&EDA%96|M#!>U)xf3v$X_o{p)VdKX?C+ z=l)zT%npC?|6w40kMggxV3$6l(?1;;*Sj9MP1G78+s;b z%U(HJS_KAHuA(?~!jQhqI6|s^o?!KC7X50PsMu;n^^Xkd?|xXEeO1ucj8`BYX)9WA z7i!-<$~-ytZQs3cTATlLmAi8>>ptY$O19=Hx;uH1J}FrEVRaxa;1d!e3Jd{)8HfO- zFe45scfcX^r9}95?phIn|K0=mAAg_I!S0Bvsh+|l`h5pDx!C>i)~~za7j!5<8eDbw zh$STdG>L#XE8y_&H;SG-0{>v2m88wTX9g07q5pk80wOc&Vz>U30}A@T4!A76{r8)~ zj21Md+f8i=J5F^9=8KU*%Mu-dB{VG01lb-#$LtG^!@`KmGQJ z)Z3_{Fi(;~4kCUmelGojHIi7D3T6_902QWtYtb8@Eg81TcvzGhT|FE{Ec*0RRqQH3 zv9i2=o`|1~fMnzr9i|0&o@v6@h6Yz!$g(FGK6Z$4v)7#e#WuHMrD463RnDvZe)e`7 z4(G%5;m0SrF`{lGBJKKhcH^&ECv{Ez@-M&?lDl*u5|}=94Ms+^{MqQAHq1_9wBzKmH0!#=3ZCr^sh@RI zT0`> z-FcNJcXx35!AUWHxnX^Glp@jxKMxe#ncJf@x&dRAxU_7>O+4Fi2XX%2vRu4_iPxfu zoy8F#SX6Hxehj@$=CgRdRcZRxOdP?y^=vhbRLDau|G{p{LE~Cxski`oP3ytn0}RpA zET`-1lXmCk?RRVG?kWiJYDiEjMYH1{Q@Td3(iUBjQDzOURkjMaK`=MeS+5yKT@&B@ z!%E#slTXp4cv&L0BQ$SZ%1qnao}BFLe>+|XxJfp7Y@2NC#ff*cKD?9@$tHBZo~wO9 zn`}fS#y|E3p7U(Hd=g6`-(S$LP(-p5}S|Yh3tbIBq+8rjBN}|WeFz9fLk<) zpvFVH>u*Iyjn!1&d1fv)ODly$(~B!?M+;K5#;+pqn8}{};JmTOvOtka?+`heJ(#wy z1k-3&TJFMq>BxL~-p?Pf(SCitH6(VEE{35>iFpg+pVovga=0-nYof(bc76IuOy!NJ zUtxwUc&q zrVUJl(S5lvSS%E>6Pl{BJyo;Tm&lAqSlAIv!K-X#+}VvZy<;HneKf9XKUe3ECx|yR z=XSLwcB9TSboz72`|HEoYgqi4ZxaGN3o2~C(7$=Au^?nnsYd0FE?x8-3_(q&n-3|3 z78@m>cpj{+%9j0z(C&+qUDKS)784XinI*LBW&KR`Tp8OjWzlpilkRBJ2aeOVU6BOs zr{5#b$2F?VrKPcLs_BN1vom|e#WD9%0*wpWytb!hqKGp5j;E$CmZBf*FoXU1y@$MQS-znq9hX!Ap-oVQExj=c!unck`${H_9PE+L zM7-E$2KHayK1@-S4+=DfDsUdfh+Tg@3}J7-9Lbol8ZSAHV%|GK#i0`jU^aZ`pucFS zUz6cEq0gkCSpgQ9-^AUN7gm?M)%|S!Po>bH3Y3dY#7#TFvShw_KiZua+M>U@Z6xG$ z&8a8^@gGJ)#5sxRZ{69^c)R9zGB*jf(q|@B;h&wYC-a6IH(>2^zlnz+HluvC+yql> z1Ev!FVaDMKQJv5(b&PP%WZjkXbuOKe?)ykghIClRoZ5oZ^fOsgi(9wvu^7p@CCMT1 zS4ah#wE2G#zg^rg=J&0YC8L@G^FBnK+p}EI?_#^YZYzzCS^co&feM(HmWtWCoy&Fp2DnipcNMC{W3c87H54-?fc?McLQ2jx&6O zXT@EZi_Xd@Nm+Q^5!e~*$@JWC6L=pjied2)F$#P9Ic?4Ki!`mLna>)_SNR zUana2o~W?f^?M9!aB z)G~*g!Qei>xvE;&w?WN}@O#{lk8gH&I z>Z;%8AWMwVV9LqyD@kZ3l~OwyHHNqJs#ThZ)Z7ljFS1H1@|-@mYtKT< zr8ZH`;8wfOc~0VupyQEd*MyF-P224xXsT3|2F3EBLRq#$-6uk&I0EBd2x1VkoD2P2oab@g>B{S(et*H;(zHK$-X z74O{Vwt5|0`@ri*QAXvb7;^G-*ccQs0Oh&)W*Dj0>xn3$kY(Eq8DdU5RbSaIUi*pl zBF(i&n*(9w{zVjIul5HY?BII zYcH*3%+qb>^jDoxs!-tn_y>yYA{i4aaq4Tgn=7Vjto!Rnld`A9Jz_+T_loTzLV#_T z;Ph;C8eC!6%3JT2|J))7JRmW@Q<+DjUn>2;=h)N_1u?}u4KXZ1YE2I8#KcbYwb%4)s2hY_JGX7IKM-HsPoy> zRbO$R_RjJkp2F{oh2Ll9?Jen${=li_KX5HU*P$>TOB}fQ54r|E09bja;V1q-u!@p` z;AGT;4mpkmp=O5gDu7tqPwv3$h_#c8^j7D(!U!N67OyG7)P2^w8F0uf3 zlk(3$`v-O@aXO;zG$Iy}{cE{_I`A(r`~Cc&Sb)YuW)ZY7{vq&Ltd1!6Pf_*%AT_K9 zKxzpmgc1OH|D43NK~`9MAa%cs8h)hs#`b84BC4JfI2oN~^&%n~q9~>DIbNRr#GzCA62;0zT__Dr<#(P3 zw=TtqnegMk*iI}uWUrLdP|*QVh;GP08oxDbv=j(8s36={pVucV7nXZpk)|+fmslXH zA6EJw2yV>6vRoiUpLlOIoqK-_MIVgJ5b|tVNit03bKK19ya>I<+dW2CeDJFmdIPep zn0uieBl(IKha22>V@1koe8rt0M)TYlk(Q(b_EoPd;%@zuTPYfRPP3;V(6G-s0WnY} zzjJ1wL*2NJ$m2soVV^xWnP7g;_;epe3{lexz zC_3@H&r(!j=3~1MG`tA5Z~_W7LPX`om&E)P0XNq*)yTvdX+t(G!#xaY?JVACeuiU^Z~h0-64l9MRE?W2%P=sYOd zFwLaS?=VNj{o0O38b#ePYO=u47ykr%@xCRJU%axr2teG!0_h~CtoC25Fh#YcsxW(0 zVKY-UjloGSc1lhF?)-dhoFA~_?2(BqlNEcd-9{`MXl;g`v>c&;x~D|M@7a3`Ls;#n z3lYlMVlc+uw|FZA^-w^}gfzs1qVa3Jw$dgO#{zFEj?%lbXK_NvKT#Qdfc9%qx z8c`MzTyiP-FGn@-NUAnW@1Z$SNl*mboEwud;*n&zx*ddYdaQr(+?rVF{Y;JGBM0lI zd&O;fm+Qmpkhuhi!l+1uq(&v~8;!ni#wb3DFl5G>1lK;PR#w5Dk#$q?k%Ed3sLLCs zg7n&Ta9u!WNUYE)r!H%<`V%PL?5A<8G*ibG23(z3`>p1i z(oFZjMAIQfcu#{dl3#=;AfWW@S@?5F4Ak~fSSBHA5v?%c$~g_%ez|rzby0UJhW60~ zC+I7AHlwSd1=RhoZ9N!t$&pKWd4o@Oz}?b1v!od7m}9 z@9Qex8CG1&XPVh*-mMVvztgKqh60s`Srto4Y2|W`QIsC%v7IN=6Eb$vLmJO@@%dG5 zU)W%!e~9Nv?xP}oGaYPxhn|8uff3#-uE7tcFHKckV>R5Y1q&(tqlj-sStQZzzb7p5 zBpPlnv#*vyO)m||Z+4v~R|(@ri{cBhX5&?-!?v`v1al|Pu$1sZMqlg3Vsx0%szTxC zv+Hq*UQC9NKu(qWC7FXHSoVhxn)hKRYWxe@yQM9>=I|&fGW-jqjkpW+ZuY%aLcT~1tH-SKV)vUwZ6oa$9HU5sl z(dIY+$Xg_iBvdjbfG^v}IUNA@fm@6*Qzj@7b?*`^l$VV%;xx<_u^9Yr%W}+8159}; zWc{gRS5i-C31&cCBK3v?TY};nbYxBdQiS7#Ijn0+$HYI_gs|!IKGjuV`)$Bt(CtuW z`Kmgxo6Cbz-O6|B`_v_)dk zl=u88h?(zS70UdEP%vDS%hm2g2K4v*v=EOgq4)e1!#}BhqnQpnNM@rebOGvo8ytqx ziTicZd zI`SWQ273wcT33UsI{F_>7bE~cUZne04)I@X_J67)K@qMx_vR=Nf?z1KE+5goXI;Ze zQn{^F0DlE39<`)R<9GJIK3fAJ-$&JYBY+3&YFEw=lKL&PgIeA>%{93$bpxmD*!}Xp zssGu^@r?6AmUytp@z&uu`170o+MfYdA$jq17joWjlCu=otHXR~qEfEWRw=CzRL z=4;MJ_a6LsOYGd@y4!lNvJqCe@>O#B8d!-G~jBef< zehuAG#FM4EL&f53>V+y9JaTJ!Qp>9#{1@Htp(Z7-(8yN+?~}NU$E3x9-3Bn1F#p>?5_V7T*KFR)^&) zCc{ZR9D0>8o_st7z)5TZ{voain2>Q?mzj5tq*ZtpUfXq(?;NHy?xkZ}4`qrxJ>6^b zyAZnnq4mC?TizvKuUe^2IiqI5kEX4PXyFIjwWA$Dx4_0_vo?4EC-Bl6=e%YHdOOge z6qrvS_zkX7^H8%8a6k|w(*_*2B;~Q!MvnT&_rbS`Q-%bVUTTpKs^=*tv+XN*GOh$; zh`NkOw!416ck?qQAn)8I+6+*%8^+#q`D%jsN^e9-`3EUKqC?|h9na*oshltQq`-kr z>FgW!m#^7u)WP@N`kCNyy>e4}cG>-Bs$+zWGPjjm3*Y!Z)2@*PG?iwlhN(~T6;B4VjaF`NWH#N>JD~{w4ZO5ng(2HkB?UvKbdi?AJDG6 zA2F)A{U)9nV*@h~#)2v}7)8BLXZ8SoSbV2jxII3i^#udZaJHfBReZD%9aNdzeyj)! ziCiU~!O6KNma?f>zovlNdOE7bj&+jb1=u#u)0(2-t$)&C3i3zyqy?hG4?&v7d(hek zJBsYBd5;fbo-s>|_283Q+WL8;M_@F6)%L{KTlrJcPnVNPEdJEE_7z4wCONs8HQk3zH=$n20qsn)u&e3xXo*O*@Qq#0Srsoq0$ zJbnTO+fI=$cVAoA7|%6ey=F*M(Vi5&tG6_=;j1mz0Tu*v?>TIFRzS5DtpStD8G@|h ziMbaMsL~(=@(&&)&luI{MV4cv4@%}W`UFoGgX>l*Cq@QSxIa1MaXs#*mG-E%W28M` z1GzJJq>hoQB=)TTiqzrJva-JZ)Byj&<%FU03#>SPGD0+IsTYCK^&=`Up~U`l_k8Md zkEGzicM8vQnYa(|0_wR+W2g1Rq|rM<(e;dXZ00aICNSs62- z_!a~S=QW?B!R~x(#>dqoX6f6MByK&FNCcRPFXMej^5j8cY8G%u3@Nq!k19=Cy=GlM z74?LXfMFVf>J@KtFD_iE#PQEHd)G7X%M_{#4Ua-BsGOhDOCw?Ky$Qs>z5ddwYmtat zMV2DneNYe%4x&WUv-8J`iNZ!1GDIs(S|5Xu?^-ht8IUMUzzbbEqWWpC3*7z`RzthL z+5^bwy^dQTZDuVg8^kY5;wp7>eRUNgy#c4_z52#G5(nuxWvP35#`*CCV*|tl--Pt( zw)iXe?v7b{h4v?Ei`AyLY8?`@=<VX`G#atAsfr=(Q3 z>i0)g#YnH#H~&+WoE_g>0N7M?`M|Z=#sIDerSmmx>?T4#%w&{YYF=;B4u#|i1nur?QNO0K zGVRid=cqWTJhtW`ebK}xeaw~1SbCJMAY|sapZ@JY_{6gLd3XNJ?q7>2q^+vf{T|QVC-D!Bm>r2BQR!+hGBK!FQre zYThR_{u#w0BVvdTo8dbpX}b?U_da5r)H(#*(R46^8&pz|CrdHs9@%^qCS=wTSoP>r z>LCbb;1&)L;J;o5;iB7jw81uxAEYdv=U74My0E_9v@3SYoEt7V;KHr5gDW-HTMr zCPB|OijXtN3KWgqCd%~PS3eK`ECy(O%t~hZR%M3-K=vq|F<_c+J8mjXVfrp1Do229 zyc;p6}XpVl!F{YAmCC}3OuA9ciqQ1@3O6c7+mwmv?p zzS9NLb~eS!Ijp_3?Vg{bmc6D>M`(99g0cma!4$-JM;=+{&nBEYwW_VCx%K;AZX-$8|N1Yl3 z6|#HEddiC6uv|>=2l%rg4$TTYbAIM52M*RMQNKqkXdQF!a}@O{olsN+&A$N*LYTRs z%T62yj_sFdBZv^Bz9Jvy=3xJw1$p=^JlBx{3-AzW^ z1hYWM$Heq+7NB4jaF-!7C8)phSYT^J~=JWBrOqdloly3-mAvInAY54q>P$op5$N z-H>38!VKlLYXhJNNdfrh2!i>;m&w8Ez@s00VzikO6jb0{s75fu5fK+qd%_+m4SM$- z>wYQKWp8vn-U>p-l!GEB3DEq{OMTCQCz^2c^nO?+5tigOvkBTSK0Ju#*Bpfkp{{;! zjP6u>5}g3~HK-JVP+|9_@NAXn;e-lC&ar&%Jm{YdXzi3PE`OJoP8$W$yy#B06xpBs ziil!3aIdWy9+;9!6EqdkYGiui| zp8!csy^6V!GYCQt3Rx#TCyfb6NyF}u+U1S3#|ZC-W0e89jmmcrX5x|B0^0X~YPKU$ z*W|3@7KQ_ey+97PSzT#KB;$d1CdkwQS%*5{Wf|-*fKW&5Z249ETM(qKWq6w;NK5m< zr>+a0drl%eql{&NL=v!1P|O0V`4R|3c0ddzbM^vHgV#mQ;W;2M69WK9lJ{e_H@6FYJ$K{VkH?$OGgZC?dal(u4@4CC0&vZ15S!@V@EZBMz~&0bLLSq0719UdN@9ad)Odxgi)gy3Quko zNhc9*8m&q{zKhaBAB%4#Skj%R!3$CXsiJm6abulh7iR}+>|fn%pQ%zyrtSiAYzjc{ zjMPtESF?@o?I8RKxkF&*8R9kd)vE zLd7^xYH0!F41^am_v!mTrzF9d+kmr`=0LAh`sV4r=Li@1)4lf~K_T$76Q_Q9^Ja)69R&JTkJW?B z>1t*(z-CB$g1X4!{lySm7&Kz~cq1Qh7wo2OmtY_#M$o&`8Gm*Wm?nINXAwXK3&@wGXS5ZO$%uZTOKwcHu*I?zW&s9DkW^(WfwjpCoc<^jUBxH|lS?!F~ofKYD^-rU%@ zu-Rvpy&yUmC8_w{S}p2#a>FL5L>GLSUHec1$ytCA(Wy>1Ar>aV%>>AIkaCy>-fvOzGrkpOKsH?Oyddg#o>%bT1n@xf_pQ^jhab>) z&C1=yV{q1>ex`3fX;b92`|9Q~2w{bG;iS%V>{;fMo!(smp|eJSHOuHQ+lZ5Sb%gA5 z#_$JtzEj6=rlZ|=EQ=0Zr2_uZD`1VoL1eYiL4 zW_zreVerb&O47jci~k2|*=P?FmXiWNvP5GPqDq}HFd1RTPmCmYouN@4JVEVClGtDrdSu8yAaJVyP%zd%r~$l&C4Hcsk9}7 zfu&pEn{nUP z?4&pBgd}G^&7km;apAy7W4t`dLssv5=C{rRTVIQNppKIa;^^odPvPW(u?y z0BL=4GV!z&oAeC}uVlrOtHdua3w@aamdVo|gpT}nJGIBC) z&%Txk*9IIzKX@-Gpl0bDU`iVM+~q|atJ)pPW?mPtp4MO+2z%u~L^X0+;kv{#nDUZ{ZL~;Bk(31i@KIJ!iaXjY%q;qRnolpK3YovVBvT#3yOyn*%~{$ zY?4ALl`oC#Jok}!%?i|nX$!hOGfKA`P>Zi`r2z%Wr+Re=&8$D zO}@xDgo0lBpfEM{v#_#wDQ|}Gj?*%?@zbAOJM-hhW#&iKZCehZInsBD3`RX_dXIr$ zupf1vv&RO8T%e95WJ+G26-{1w87@l*qy$?|R|}!;IbCQ|5uqKVXk#-Q=Zn!AP&(Fn zz(i*oT$hY`ayxE-63g}hMr-K`)^xR0nkxwi>J2{lb|BscHhfMxC8g5lQ|xD2l$5FJ z0)_}S`zCD7A?8su{ZCP&mFx!*@5G0(V~r}AjnlTjb+3H;NR2|10y}j|H<$IuuM6Tv z2jak(PBj8DNo54jf~#2UyNH5@M2_(Xl)K8KSypvcjM`fWsLE+V%>~7J#y97a?aMU1 z{lg!$x7|jnE&DY}T)Yz9)x#qXuu1qUX64%4xEnBE>jJCjgZZ^jh!^ceHlIQY;U)x+ zg(h@bN+b>Zj8yKoGB3iD%oVS$FmAS!%I@%VDImd-%xJo&vf=g&PtuVquS=~EN$o-8 zqLLL3tUL()ATEG%5f#zbx!RHSPV41YOr7?tP>yWQvlpzeE6-;EB|1KzX+A8Jt%#E{nw2;RC_2a^?7^9_%9 z{OUn+nleF9QdHTeT=>-SAwdf4D zYSu?<#VJ&F-KsobWPVbZ+HpX8Kbc6C#ZDX?J5Q$XMM#{wRFLu4&eb| zY0)i1g|P~UbKin3prY$Z{Pg3hv~WMFy1P4NYW~*~SR;>^$Hq!c^MnFOcAe~KE!p8;TOcPW2I#S=}9k&`X;M9Wsl*--Yr zotSsmf5KD}&un@s^XeqO_{77a8+cidKmFA=uZ(v6x~g9D?3t;HKcq=UYx zH{JT3xhr?-7yO?T+!Q_{3k855O3Ts_%i6%1$0=!?Zq1<>Ce z?aUcAr*7F)i`|?Jogd|kMDe;5!9Gey;>#mDj=6Q=>DmmnAS`F20XQxMNosVpagTlSG=n}iD zDnF!pqhTC~m8BHpfTlWspSPewk=gA@{}>uk57G3xmR=$ z4je85gvx9xkBM_E#E=znETo32P#4OB?FG;ppW`%7IgC|e1mX2PPqi-+AT5<~KfsdN zWyuJ>-KBScm=K@UAP=u1hG;_LY&wd;{iSln5Ga-?;ojwCNhYF*)0fj@OnnIwX~{q& zPT)+p7m3|9%P2wWK2xN{@I3FLOc4s zsoMPOOWVd^dd{(ABRBcYpb4h-J;Kchyj%%w#IaN)oxNB#WjV$ic&;yc&fZ3|@QE$9 z>_R{)#C@bO2(|&ORgS4JTImrV{+?%~+ON!?7L$-RFmiVgw}kozL_W?tu1h3z@P~%N zv`C^MGr_=1iKjR~)d)f&KVzc24)ixlkuJ$Z)|PT>Q-u$X|1GfJ z0;VdoNsoK{5Fc@@OM+Sq`iwFwvBkONXXqvosEm1YeMsMRlRsXnoRHqD6P00oZ!CXh z4J6cKc_2xwu4-@)Ru+W~GiKr3m!u$s0MC;CVNq)mMB}By4c3{yGQ<7_cC1F@XXvt| zo(cMoN~PPP#Ry(Hj6o1l^u#-=hXp=*D5CIkjP^3Zw>Ey}%Pam?* zX}grDxPEcgs%dx#R9Dk7gIG0S$-}dP_#y&~zs8#bTIR9za=lZnnfv=^-}{iFxwvIk zlmwMUkieagag_|cJ1oc}lp&Eu|6of)`5RHy=!9#rVQqp5BP|%YDoV2|VuCcjJyk47 z(bXfx-d}kp3=qwvAFHNtSw>us=d(r~a%-!XPs>SvQt{EoS^>BH1gcDecD^fRYDiJQ zqxYoH9OW#a%>zMU_`8>Kw-HgKq67UDNvOg&K0vTwq~E&5dHxVa#Zba1=0vlE1^Pgt zzVcv)KZGDQDhH7+RYy^~6QpRS-r4zHJ_q7hapWS8d7(Rd?J56eDh2spuJA@NaJb=S z1?!V4RP9rh_Au&iR?%!GrKI+?Jp`)OEb}SyPrEkQW*{Elex~)0pvocvEa3{mch0}f zVTRKonlI%{vB@DJ?xH3nCISwx|H6%t(*$Zk|5F3Skpj~i+~VqF>=7JDsn+_~bMEtu z+j}S^1e1eLQ%+?cj0Yv4Q|@4iYD-d3K>RL_wUq%Qh*Bh4Qk5R~RNxVJ(pJzZX1Exf zHLm9*l7JPuM-y^F?)~Z$Na?V+hU*9C-22-hdCJ9~HYA*5@|@`-hcuy0JpL_zD$h>Y z;iRj15oeJ(Dp-5)W%rvc)j;(DS{%uYh{Ovw_+QwlxInMq?eF8j`Pfh)F`G<~W&JY> z&ZuuY-y3Eo{MBe6Kp}ujCcv~Q0Wswt-gh3n(m@h^{$F+#At(@#r%2FLyT4+Pz`%OI z^|h?X+x{C|@cIp|h(QHJzh@gX21G-%0?xh~M1R}GL-LfQ10_P%{G7vw}IE3OMqdV1sp3ekIh>^>!gEB=xtJu*m}45KZ2pY^xuLZBV19S zz7!8e-st-FF$|Dgy+}!FTCMOZCs66u&)NtG5ukq=`uq;4z}5gm_7QMW9{qLTF*1e~ zV$O|R2ZaR*dY*Rbzv5x|vR=dqDr#`$wjOL*e0E3l=F(ku2)H>`y|-pSocgHyrQnaZ zADvo$cEia$UxU5@z>vX41;?oe>d2vECu$f5`ZlC<7CM; zPF)h2wC$#AZNVC2(ke3J0o2rFv**?^NF@70z6aeV(`)gm+RA}v{(u^!pPu>M^PJ7` z#gtH*$np=%0f0wdJ_R&S6fr-(Y9Wu{C!mBLp~!d@|5#IDym-asuP{Hb68eEW%CO!4 z3M7Er9)3jLXzXWezDvya1287#peRxF8c1kU&szW!&hz~U2!{H7N6PFO1+=1NhMj=c zP6Ms+c-kHm$!Tk$vTbIFJb8C1Jx)bb!l~*Bh+gYW&9h_xEM6ebCp3T>!CAL{R?-Jv zv$lm9hpuP)E2($LfI4U&rP=Dy3e0+tvAIG>`|i%)?9pBtJeqEaaBjcSc|1{~ZQqx` z2$Wl;xi#rAaJmL00@}i{O?_AJ1l>Vb(q3i9rh&=70vTu^4Dtg>S9+E7qN#3)`MyM1 zY*8S>cs%{~p=9HO#%jja&c|XGKe#nd-`^&00i{E0#SGiSATvinlgX001MdHri&!w1oODV?J(;Btw)STsHNI3K8w zCXKxrwNx0<&e$iSwuW=VCX@v76Wwwt*-(qIYYQF%eR+}fh2zE1+#cr}h1TP~ zrRDGJM)F?xYW4IDl!f@jGlXe~djd6m8zAU}897ub4Gtb=GAVJWzN?ib@))zk9*8wG zKt8Afu5gu(S=C$Hx;z}H>wo*7OKQx0n^}<4I09)(1(7qE8K-7PHjx3f^h~C6QQb_V z4YU?TL*ne$HJ?*DjVd2(7;rrB-M8?&1QcBUlsvu2r1FcS)D&f92I~rm0qxw8x_6Vp z+6mdmcD;$CsD-1a-+|t)EUs%TeWyf)HR#FT=RznjtBL6YY=8=B1gPLs8*3ABR?DVl z!3J`->`$yP9vLBH9BJ3%R~deCb#bCAn9AfCT0Ih>e4(e%%B)+F{=mBeO({ctyy-a* zss3nKinhhe_xAu&r_oUr6`YqvF}!wTatGgxbhmK_0nh$Bz5E^%Wh!b06i%)XuBdCj zH-VF%N0s|F{ELsG1?g0+-jLaXM9CfYvG6S9?%L%Kg$5dto;jmDxlEJF%)+&zOJI;D z9-EvsPm5IodH9ETL53o~c)+RC;w3g-^VB`Hp5_^4^)mLfJNsvQFcE@c=Ng2G?5=Ce z%6@?O-XB<$1m$}Rz-*PVuI#sbAEkDDOeJ6YB7;w|cbCkUHn2uVYs;=qyHaObh}ND+ ztGR812o#1Lf$BFPkP?XT$gOK_($MsU-f~3v^DO|bT>>_vB2@EN{(#cTvve``G!T6H zH}l%z42g4J;@LYc6uXjFB(HrKcFf0pUT;4M4~v*5#ed#P8dT@77khHFNgLA_!^G9^ zA=97fyL$gXEA52Oe&Pp!(4&{tQ;$?5S!qTt&kj5dB&|>zHF&CvLWqdIX(B5Z+R3rA z76xb+YIpw287t6W?kkL!jo8EF9=s70P2aa+P%$x{_}oSZ#6i;}U*AreJW2T~U|Q;q z<{jFZkaIR0^UesKXS-*m_IVbFu`J)oPG}C)ry74x_db|q*eM4^+0*BP%j$wDnN_OV zYjF{>e@$uwHKsJb3i14=Lj|ZLZ~-=v&mf9S&ULgNKk(Ir_{_cocSd+ zCvYA};g)r_MLvV4t9VQ{1q~F&FjEIx_%qW(S$Ugu3!1ucoBuD69Lx;Z>%nax_TLBl^?uYE>V=;xXZTv%G~OawBAlJ z@>%uj$-B)m?bv^&haQ?EK$Kkal`@Qk3)HF8W1Fs(7C1tZQ>Q*YDW{1&DS*`J9D*w1 zgSX3&$dMvLHuAv)m*0ZXo7O#0m`J5tHCmty@`%A7E?#03ZU8x|zfdxUHQLXTO(Uwf zdw*>lc+gI_yu2?Sh)oIOcks&i{4ae}d4^2GS4rwZVcJ_H99L;#?hLA)Km0%rRcU;X zjj}l2hGRFB*y+o$=W205=#b!AI#{j7nXYzx1Scyx+c`=mf5B{)9)wc0#Evw03P&Z* zq+7keB(OWSwg*OBxMBMZ>qwH^#_u6mFiMn8~_7&mt z_2pNpeD*3U=y zo9YpZ{z?h5?GZA;EkTnf+jX_F#pIq1A#YzNXz{D0)yVne+sAuc3-8t*-|j+qT=T>M-RxsmCSwg z{Y;HEhubrg!XsxTKz|0{-CZJ{o;>@ZMo_uWy|vYdtynCin*!$xf9+EM!eZwHy1MI} z7v|Rs{6uOAWKuKt6~Xs1vJNDbo6K8AR@p#;w<1N~-S(okcGB^Z!T6rYp&IoWo~{w) z+yE1%ECFfNW5C7?rt&H>f(q(7J{(t_Fr{<>b;EoHW6dETXlytDW%Bu2#%6dHe?{;e z%n(X;*H|Jr#RnwJb)sefkBB@u9y167?!WiV7ls+&|MJTN0pgR*Em!gWqSIkwOE%@U z{3;6Yne*kdb-=rB_Kbm=PSe7^KJHQdBDBY^YV7YxC!$S@s63bvY!Xn^T)Fnz80nH9 z^2}8ZmVHV1O_(*`t`HM&8^8AzN+^IhMt|gG+^C;bsGJ=dxe}8NfmE2o`s2*!yRHhu zXtx_{h#sc{Y;`z--_|sOTLvUtDy{-637Q(Cr2HyuSrucl`nz?`at2LXC8K@ce%BKK zU+#~C;;S)UR5;wgzwq<`;87hd|I`l#=2HdA!~=NI#Qbarwg#&Lep)D5_?)v(4+abz zQwt^muJeLxZf#RB3bUKt2rdio5|45tOKOrN|5P_1K-#cT0(b_C3SVLKJSkGF35qx$ zLEIJ+tplIsm_D6MM|>0c0c6kJMfwukz*iw2q@AqxX*xCOU<*W|_6<02;Tl%HUY|uW zM)Mw>rveHZAe_q7;kF@RvyYm-l^=`MP_|n@i*M*Tz4gyuQ6NCn0hy$|lFPuSlKkpJ zl#b`RhK<=CgG8B-k7e;6-I5tWkepJOK0Q7BL0hJah1Ub4Qwo0 z{>%ah26A8^P(v#Zy!+RAz_M&WoGeYfg!C7jP+%f~GwL=-7Jp)5Fu>9vnqwxq&;AED z!Q(sd;fzQLW{O*X?F=SEDhQ^Bdwl+Tyi^c4gKL0z|L-yggbjl*Jwm4Y&cDY~pn)?v zU(kB~>th5c2GQl=GWqZE>Ohi35TXMEa@s%JNsT8cLb^TfBm|Vh0JZJPzz0c`OBFB3 zzqe4J0nx55U`SqYIrnSlD79o_Lb|Q6b6D*Da1X-t;DX6|XH(RA^DeX@>AVg->{twI z2fC!`Y~0^31*QTNw}2>{1W2S1ur-nXy=!0~%G*vv?*DrD|F+Nm6rn)=jwOVe!+U2| zRrJi_{WGLH1Z-pNKpTQuX2-Oj4g-ZETVutV&0dax50{Pv7V(LR^fknFY5(9G$g)T=TF*?+G&Pu(lSd<8uE4B{=gsMKpXM;esN1YgfJxaL0fFa{s!_yN8f!CF5% zQfsT(&if(i0Mr5gvaO&+7UQN`)i2%drxnB`ttTm_}^Bn*Df zO)bH#A(4~x)xLoN@TnI;pS?x!<)SIEeEsi>hNWHOJ9d6kfh_OE{63!X!U78eSc#tYX5aQf zuH@o{ud^Q2Mc^$!zHL+&ye5bYL8Z&$kD8$hqeeGStx1Fd0W~rL-=5<{gK{4b0PO)3 zaSBqt7=p{OoR7MJ2)GLa>6Ygb&qJlaLh^FLVlGf2`ZD1h1>~AxpziVeY?pYpGjQv6 z<0W`X@iH)zi?g*iH(_Fz*+5BzmNuGm`%KK=#|;tGX!&%1eI^O+<}`#?NR?4%-RFt= zDE|YPE$1I!s|-GwWuT$_z(e%i(=1Thm?)nC6+@PIK%AfgB9s=U*@UHLP`FxHkB+}G z@&Rq{B^M6d$6!mtOnrgWYr?3c``g|(?D50KghX<7MS<_()I4#r%S4$CCOkn{-LCm{<9zAI+Qc9AwGs7F;3~v zZsAT?-#rI4$&(UBNLP%9LxxBUtk0leFbs^go$l%;Q9KFHDhh{-DuJUzBOjTkVp6sz z3J*JouoLc!6X{{fi)4}V`kt-f-{?x$F?yFp75K{_f0mJ-Z>P!_`k+1~N4$*`ifV!M zndx}wVX+{o{s1z)H2H%y$Fq1xVX>SLCszBlv77}xS;T)??rCA-RVd;lBNFw#ASg@KT{%D1d zp{^rNnj3hB`>!+u3t4FRO0rSldr1;DBfnk%>cLWd15u&X*s+f5G#DaW6Y;#NRWIg& zAl3(e23fvm*FMl18zBccKTKDM(18gyncv~?^FY~_dOxL zF2N2)6dxiaqnTqj3JOD=BR}`tM?>76F;f}i<VA zp`cWrf)WqWp)EU?odY{mIt$c-RpX31ITUzsws?SoPL@^?bJJ(!h?!Mkq0fMTtrPWi zrN!|@ln=MGl<*^ZV1Ev!$k;(Wq_Bu>ybr;5P%GW?BAXPvtRG~RdFo}gl&JyD-DH@Q zENJZRBnwN)+yR1Wq=&2)czzOGJx1MHqE(EoxUJS_2(3Dp;O`X*Y~Z9imw@=hZWl(`zx9!vWYFW!G*#PBCn>QU(U z-`e}isH)cQUD$+_5`qXQ-K8`lu_@_pL<#AVO$dT0ctEL5NlOXRA<`kCA|TyJiiDH` z!ZzTj+_?qL8UOp?-uoZp-Vb+-pC1@QWv}(Fwby#*oX>ooXI2f>m*&xCI^HbI-B{Ir z`P{^X*fL@vl!5Tlajwv%%*^Ya{`pC?V9w<+_F5MKni-zVo^xu)9u;6O067T%NgsZW zMgz2M(Rlm|r8lG!x}L|leQYGsa7L0X%jZdSo{FzJYNI--H-s5x?2XP%MW{F_OwssCb7K{WD20_H*?tij~ zAQLRu&#HFm__#=BT}WAi7xIOVkIOty17JVcD*V&RpddFMsS1<1%^(p4u*614zob>s3g@Zh`$24#2OnLe_5)Q~If(<7bh z4+SeQk6Y}F`JT5LMkD2qSq0mh1in!{mGgGb7&@OiH+A1>ik&jO-=R z$!e#OQnM;g=_noHT+|mQ4bh`|a*3q^kU#(nH?UN^M_l4DSmPK-*wr&YEBFIztCed4 zkMWK)`bX|kBT9+zX5j0wawef2OD?Y4p^!r=@P-X9L8f10+_ze|}=oHq0 z4M1IVNj|a9Vi=jKh+_#G-mv#k<}Hbjg@1uRDarK6Yj@1VlFsh2s1wzVveWboDz?Zd zH~O)o?~E9=NF_lJ|2E#@=3|RAMynpeGn9jlGds&Y26}LHA7Pu<(F$K~PBknuE=y}J z(Is_CRsw}2Vf$s_Yzjp#a@ZuHRVoQG+7apl0CH`%Iv}d9LuHb@0N8Y0Zp%WEF@)CF zr!GtK2-T~FU{~>i4bNtfT<1 z36LNF+t7Wy6yy5hpVPa3^6Mh|^ThwA^q8p!M(5C|K2Uf;W~Cx;32JAb4?r3FtH<)Uex3U@#VfKiSZgyU zpo=n#3r3r``sg-~hXN zJ?ggU7jAq6Toe(mpwXX=C}i1v3F^QnGZQX-@d`AZYK zLD6&{%##V@nI?;*7`Z%J$Y)+Jj5XLY_WUAY=bQ)*iF=ro-! zzuKR6CQ$O>{ho&OHelITpn)l3BXX?k#@5g&<3`jQ?bs&qG}Y!+g^ds;LZ#wVibK%) z6-Rbr0c6upZ6(2l@%P@qy^mB^97=(dF)i%|x3}DtQs+JI!VXL3Gki_kprTik+3geb zJm(H~rFlNw^VN3USyDdEnGxR76JSNA`Cv5HWcLNtOBLhjjy)lH#+S8fr{8jw-Jqb0 zC5(vqvj@i7BFsx%MzK^)F@9e#F0>mSyoCY~s#z_0dID&Gz0$@{P1pW>{MY!7+QwN} za_i^V!;T)}j{pa|VZd!MLIbhu#+wM5Chs-yu!>DqoaoiS{y5LmgZ&lEWd?t&k5*&`9dBP4OnEX;;BjamTBzD zwT!TA>DjZXK87Yh$7kiZr}t{UgC?{mt(Trv95*w9tP9*FV!Ci#%n9WG1T1C>1PBR6 zi;4ilhg7qi_or)5qOlkB#+N@hWeW<-mdEg;DoUD362%3CnKxXXhm&;`pASF2F<{mC z7&hl1Ts+`%CX1em5R(I$E@t!=leWJQee!s{&|XSmS5QhdoijG(5QQK?`7J6*qiV!r zl5?%@cjYp49aVh3Gm0&9;+qo}+&6oUFsZgA+oUI&~D5ttnMkL3DRG@H>jC}NzhQb1!gS~yKGDC0{0v|OUW#bne*!mh6<;!n@89*bZDIRv zz&n3Opdg&g?IBzvNNK*lQI7&kwWC}FUn?8-k7Cc4Nqnn~&4mM9mab|?8CEBnkCyTn zTacw%oo%X9w`}mti}CqkT>V0b?cQ@Sc7qKYp2WvY66F?3$8g3Hn{JJ>k<4`{YFjiL zvcwz*t)LInkkz@XCR}5DmHx7jxPkx3l^%4Jd-MxT1&-JgA9IFO4GCFwY`ITCj__F@ zjbjBdPQ*hg#}9nCH@G_N)t_-gLN(^KwD}4#>Syfoxy!PVMjwIw21|%X!J2620J?R? zF2UO`DK6f!am~lj=PqU*zG?yG1evR zP22-`(u-))&+rXhB@%U;!t{y^Bvea)e+SsA*haqVqQk+R{Hs)f=B)zMe&egD3|y&1 z+n5UL1@i=`UQl+S*P&MQ!H3MeG~+4kbQ8HMur7ih`Iq;{OwBz7KCF--XR}^E1S9bTQh}RGu^ot6L6O z!@AnIO}9T2%|b{oo*+TPas!A(UB+DjMTx)nu{RaOr2-^A_K;!D2T;Z@>?w!ekT z%}Y)-zMt%#9>Lirg1*3HK>UMxKGmGyPa9r=YY=2fSS5u}18@^#&I;YHDS0BH-i9dr z189hxDoEuv3uO}a`-DBc3fr4p%>y|7%M${SfJssg`hElR;TsD}<&EpbKt7ZPo6%2X z=L$Ic^CHd7+{(_FG(Gl{G`p`On{K=P4s8&Q@AuJpioM`(`uSAbid6^{N=ZTXgWcWT z{ZbqJRitXbW~mmLfP@a4NL0LZw!PX{W94j6Q#xf*R$40_5LpOUcDFZA%G20;^F^Z& zZYEYwM7(_t`hwtbvTpPt;RYLSE1tBQ?fqV;DXEB7NxwV+IRu#PPCm1gJ6~6P{wLEr zPa}{s0qDK&IofJeY^a8as9!H+d$s&|)kXUt-+yIl(Zt$*Zc`vW@yU1h^kO*8)V+3m zzi4_f&|Djvm2e4t!xv314jr$&3Af|M00p*qEFoTPx&y){z`zWG5^O$t=WhMIcU7?D ztHKXWg!u-~iVB0TpP#m(y+9F9OFgO>InpLP4(x_&@86SrVYq13HtCRct-*77w6P&Z z0++zgS?e!xX+w`7g}@rs&er)Lzeh^g%9;=#(_Fp*p2%a~(_kK%6L;wvl*$%W_F81s z8l@z#zOmFDsTjlLd;=e9g*NV=o{LW(5N{`te~0aWcW?_dYppxoe9Jk`hMZO$MS@lc zlI_tL?emNUt;WUX@-0*RofGpxK{QXLu#uvic=fUDj|%}4!#g(Z#D1;qEJoG{X#=PB z-?F7R1MmJ4BUzWoa{uumGxlSxiPj%yrQ!R(?euPNn2q-SUS4!e$JGjQ_;gYb1HXM* zoW!~PxbWX|ZIw3MOk(SjZBnOVtF(~S$h0J| zhH~y5W2ITOJR@ctuiW>^60j`7{iGk-@I=}N1J>4Y((zPa`Vd0vx=Y>ta}BBwkSX}K z>8ZH{)+B}=vzTZ1_2Ps?5oUjzNLmu&`#rEHFmx5bEenqS1g0^5KsUJzjtOOqM2rrI zXU*TzG!5zLy=qjA_LG&-iKcp0-=4islBAeVHSMX;_|l7`)3oF(P_EUu{YQbxt*=;hnwP1%Mq2NB zE$ZV*_Xxz1Q4oa&<@_yhGW#1za=-Z;xN+P6F}?A4*8TJxFguTJ#567llv1r)TE`X4 z{lwqFJbRA?GIkZ0oT!OXR_`+46*lJ-2%HVTtUehouV09O4%_<@8=e!0Jc?LwL^HY{ zWx#2!uJ@ruwFU@V6&1S>E50Xz-xZ}7ZS7!0SP@+`_JMA_;uGPy zv$uG=m62Dt4HD$L`R&phDktN$4=VHWs8}5uer?>tuHm%JnWW-WzP1s4AB)H`yiHE+ zbkj0(F@Y(gb5xn>F7Ypbot&B#rJK(UccWWU|Z#UZ#;VY_K%xgs?ASK-n}=^wA_XY3x9uY(k#Pnox5+gfsWw8R~4`QtiIUJ{i0+khS%wl$tacLEJ^uH#aJ*LFW*BlY{GVN>`KEU#t7}WhT$& z-v9nq2Tn(h4oOQ$q(LijSGujCumD{OYTnjU_{BS4wf*Gx`O16XEqhR${aq_d^Owo4 zF}Nj~L5h~M3}z&*w+OZS+GK#~Yz0W_o!s!pAeHUl{L$g%f9QOfEgLIf@0-;Xvjn$AJioY_MDNVX@;f&WYkggV(O&a7`-oL^t3~nvxhdH zG#W*ZeOcxy22;OFT`&?UpvS|yd=87n75^1jo$F5~PVF;_6+UARH_sBhGb?F8hnvZ$ zP{92#NCG!g8}*0g4gVXjl&ve#e{tyk%P)(aE?r6zYB?e0xRkm<1%&=S+~?%?aVZN9 ziMJK0NR)eeE)Q-d7)^q`yIPO~4`Ta>ozQk2Avh};Ky$_OpZWx{+5;Kc#DD#Ku_6s1 z6Nu3vj$7$C!3RJHetqhnvf_U~wgPIN#J&fE|5Qpavx5P9k%zU)|8LE^|K`k&|6Kfk zzWJj^{XdWW|Fd^qmlEIUcqUGD`)CZ%@U8>CrElQ9wOLlJK=M-(Y@xtKXQlfNsGOO= zBr;WJwmH%46c0t0V%s$pkMG8eLOar)6O=Q}cI`x(P5L3dicuH~UIsZws`5v4NG>&URr_cP8kFKfH{K3LimV6(QG zN@RU{IR*E{8%GQ6m_n%fr*F0feq3zy*|6u7;(_H{H+cl4fjuZ>WMBp06SDraU=GV_ z2j3BOEursNsX2&yg-5g^n(90guSkLV!vlM1iM(nJGF^Wzx7e!Dw_p~i;5mE2kWp<6 z0Czkv!PtIXMJGg4AU42~xW4Ly@69}31tzsT>&@MJ0rnqbjMZ_39 zEr6l|94+$q9&dwrifl>uGUpjq+lJ8CmwbrLPjIKq?DAu5ZJsyAT%@OEdFFpKMkfSc zff_puMqI`b&Wa@pKtrL`>LsGY9LG9WJ4lx5>lxnbAiZ8l-P?U|mkDbSXXc>st0-2V zg@O-(T9*gO)HKNVi#`?|P2RzgbsBzZT63m5L>@j)=<|NV_BG{uN?OyG|78x2V*(;I z?j)j>GR%N{9f;QX1~hDc17Hg@EvzGK>)PA%_%l@5G4&j@Yu~9p2>pb93fRVaB}`lQ zr(XgX1#CBl!IsewYoZbv;Y!SoBqymKs);TJ?gV6rC+n{lduav9F3@K*(XO$bs*`L& zf$tA!$MQSspaRaf>j2|!$+f4CM6W)-`^#VDfP2O9Ni69QxN32Nl zS7gkwSvZ00a!i?oNaoDvD4>)yfQ4g?^~1X?mnc@;8-M_Mz};;NHhJJ^^Vcr-%wy=_ ze24oobYTn1l!tu8HHvK%*(a=tfkY7`8=pn4gU3bz7}(Lgn;CdmWNv+W2f7D=>o0yl z6Kd4M1W;?5``^GA;tQ}lNuoS6BbKf@f3pSHdfeL?>_T^!mMHNNY;fIRKWe5PBx~dJ z`i;&fzvzy&7o`AyXDdED1?>>8sZU)3$+ZuMM%RG^QIlbhH4-eao=u0>4AfMspb7&Z z_;q}+KTGVDAjSm3kQfS8HYAf8-mA_EqING)?Gk)&|7`*9&JO_#;ap%a0GgNX&@@`wO$kQhtRMB_xU}6pSYeek@GkOoocV{R5+^gFA z{nl*t+ZAM_vB&Mzwh-vPsn^^LcH&n-+?{X1jw0Kpx5Ca`^=9=nh=g8DRPwnen6xMlA~O#V#M?<#Sw>k$og_;1SW6MLOW@r&3uGv-#*!!szaMe1Li zTUu^apk}c9`T?^F$O?Jgm+GVOF5s6Zp7LMjyRgjvPs@4dNLiOyY~EerJ}V`rv(leY zB_7YJk9A!vjluRsSLI>k+Ro|hn5C81BSFONeP}FgFnXFwNkF$xspzCEH7~FS{!DfO zQSg6#*)*Bm-P3PvIK6LaW^Ms8zj|qam{GuroxEb} zrSHAS?s-}ocVBh8SHz`v>U<@qeG5ZD!rADKqT9EiJq>`E=a+>ypl}*(90lCmWjgwE z?R0{Zb7{23f=Kf#w`oCu7%5U3J<|Q0;6)k1}V9_rB`I^xaVfCLxc7 zwGO)3Ta%v4Lic~h03*w^>br`$`1w;qU~yZmw36FYmp(z-;56I#75b+lUd|>TdX>1| z%wFx^m|>4a@*IUVJ*~w*;YO<>r@CjqldG()Iwq4S)tHlM7rs-;JJLdO`(dxEwjaa( z8fws$whOX~{ zhxSGX_s$*k*N!>b$H_Skr=`-2k17i)>E?zh^fbxoQy6cPM&hM zZhc?;wO8%CBDG?1aOQQ`*2Bj{A8L7tm^VMM5?35DoTx=g+w282lpG z@@suC?c9Ft3n$`$lfs=fWP1I*&GtRH86~2+L|QeQ$waEBa`YN()L^0W%8f?wlLsEp zjPdo5a61$A*bf&^zblU7drqbMk%EXh2nPW_kV^=<7Y1UUY`4Px{2hLr;6=2tty<4mwk61qJNK zvB$Vi;JA1nZHjk%$cwr`;{9zo6jazXU{6fJk7S^AZKppzWKb}o8bx>}H1==_NN}RY zovOED8~?K+><=>PY_v!PcSy+by75T|I|vw_6CNMZDjUZwJy@BA{dnEXra|I@@5026 z4~dHht0LnkVPQGE7dVKQaMG7oN`sFN`JY?yzq%FN2e z)`lcIVVz7&Y-nVpm2&Y(e*TpMaZ%CHu`v#Bt5c_Aa7IKJC%nIPV>CN6a#>>&kU4HM zAls`23Ehp(Q_ZTp^3ji~+d#YtPVLoxUu>FH_urj+hL4-?KwaMdyLPlBY zWncH(w{uny=rVbG1Oq+&RFm(s{@Tr%hN^-BmD^}Kk^G_}r$e&RfM%MRddOO8p7Z|7 zD-7nlH4h?*q=hiJj(~9}7IJV(bQKwrmeQWFM z!<=BL4*tRuz$A{GNgs=+wDRX%be+;m$;>wj@uT2|(TbOieAMlM=CS^vAJj9T!rUBu zq6m7#+=qO5=C!URyd~qs_3P#9E@Y1Ej?(X_T1ipDGS>=s!Y&ERsMvnc!sn+6+i*?) zt-8wU`|D?#*Vk)n#bvK)`Kn%& z8Tl&lc~w(qgjYeDC`z4qUtF73OF~?H-Agp%;dJXgIhmQl^|-ObuLU*`L#4P1HkPKQ zryCYo$`nLoM&c#*>NRy9l_1iO2(o--qwc?eF9BlS3sGAiXRiz z>W^G=^7I)-qt{Z)x{1dz-qZs09NHTRT-)S%+mP z&l9Ey^xH;ra=pQbHb@n9c3?D{@$rL@M8Vtx9c%QrwgTuecO?DmDc*Gb?_^Um>G-(U>X|9*7z$k8Dd#_Po2P3PB+Kx)NLx1xU*Ed#LaCWw({O3^!*tphSm*`lMZTO5m02OZD6=c(_nEB? zgL!F93EQ^Pc!!U-H+OSH1WDjZbMS4d_)7?^i?F1g^jwM%R|T2MD@?BkDpw1=Mpwoa zpvdeV+%+XBgVcY%9@o0Oyo@^0_q*(jE_neehx&!k4IjZ;`~ggLo_{3P+nNSwkWdvSdDB|<_%c6}qG#FMm@VMc8XTyrVmUy+|?PFwj4 zQ$@f-d*;+?&G%hk)Ps-@nhn!!0RpvrhVkDc*V zgqA+FRd#;Zz!S=C`1JnYws(to+|vE)fuuj((+mX^#mni;8vRqrenfoYYI;GzX{@pj zue4bPt*vc6+RMwYM$O%plzHF!{P_?o=G(V#nVFe`T$BQR<^;S#s7Q6qLMp3lVKRz~ z#%+%?;Z08$b4hwGAAQ#J>eXrRB2YNMJ&(#d)#9YiurgHguxcZHCW3}#x`{b=zKj_29KjJj@!8#$Dx~|LLWZeT}df=99WSIooD|E z!=(_0t14ab(Z?}!utSLOp9sqb5w?_{L7we6!oq2fR|Vsp|1X|4;j#v{vDgY}y!yfR zhu33cV`e_@0D}S9KV!-)n1UIZn9$bK^D)P!1hI*T3hA5*L53i(G6?vk>en|qqtWLt zi@%boDj6b?oa#7v@+3^PxtjZ?67>sf4WFCKc5w%UWQpQ}y5Tfbr#&1Va9-&SrU+9< zj_d-e5#xOGQ-Kn$ikx8}m_B07fv7(BzW)ikI5*VWm2H%EFY|!mCi=zpxGT!pyBazK*oVk9Xg{U2@q{G@3oxf2}aJ z^rn5h=dB0!`S;o5t#Pjre+M9Knd=8I^Jak#x3{$|rHl&;!^%s7et=lK_YQ;aLOb!b zk?i(eIlVFT0vIs1f^7o{@&`>YHNi~!6Q28Cj`$I@^-$rE82^Tw>9|OussD2!V@R32Dp6BUU)(%g4XK+@B#J7;uVjcV5B3Yp@ZJ} zH&dFljC?Nch(qLn-l37iFC;^^pm_KO1&iQ2F7`9O?Ph5Bn_({S z`?U)NQ&UrrVcZ3aQh&~h{gNh?%0aN%fWf4j#p8 zo!fE+_psyQz_879qE`lnYr?d%>pS}|z5;yG!;c?+n8(KI!4jj+e3Lu4bmvEfXGvk9 zAK116$&ffBq9?Cd!pCR^s_-ozPb>ivG|;hEyGf6}qY8z#ZgQiq)N8;J?d|l1k>Ai$ z%N-yQ7o>L^-`6$DN-tI}DKBRfvJ7n7hxuz@{;RFwlV@RRX{n{v7v{3ViFiXAbu0T! ztHZbwPVg`Rc2W!s7w&S9gZT|Bph#M%LPSPURY1@SOa?;AHpNB?^1w02zAK)PJNP)*vT2nLTAlJwdE#BYRS*?7h z(Aiv>3cUgxSS-xhtoV^pH{KEd9NE!M^NPguw)o~kDvXF)BaE5PvF4!6{y`D)h9I)Y#7y4Vi@BUGPrqTTh2 z;XE!fZtamj;SR=JCiu2>AE}8qMj+*>#EgsEHwbggd4lm!VYc``bj9dap2p-{);ZX~ z#I&3mSa}C;dcz|R?6lp1H2&iPX#}1T%@S47FBYK1or{*;TRNR3a~F1l{rDR<38o~O zxX&DZxmJfoO*k|AY{|ywys9cM$otqfzrfhTzP`RW*1%R?x0x{Y7vX=l>D6B~5R!oi_$cvUi*geWvz$DP2Z8X< zh{LNDKtyMPxrzG>*cv)(#HoiHSay7UUvLjNwZ#sR7z}1~e0<%VFykSgU7c$rvJ|n| zJ7`Kbc?p3cT4l*4puO6OqW)&~G$_~2B2LQ8{PU|3Ik>D|ef_2ThbQPk+$mi5{QCC% z(Ouz(%DAfDFC_XX_z6M@+F%jrsd5xNBO(0p3o<@A+B|}K;Oh`H$(o@&44-W_5C9`1 zRaTGU?tCRwtUY5~zQ?a46s-LV3zSkv_pcs`9zgl zqplilEKM|I52yX>wbVzVi@JS91aZu|%!A|OwJ^`Yj>vX&jH6 z1>|DFm%u(Ce2=}g;XyX-oiN4e$2IW+9A7AmUE^~g0&G#zo0;5_>D&EA9-iEk9#Z5T3ko6vNqR8?M*;`h>qm7+_E ziu7umo0~tbXoeJ#`YpCIh!mYzRKU^Hp)EdV6s$UaGqASQzJdHJ{RJx53G;QC7; z%?NsypIdidE#L6xBy->TkdparJi2R^8V=~<=omW>f99G4W}mWeuo8$Wh-z0?O4vut zM2x9J$(NL~GFq#tQ_!tdNk@TQK}pGD80De_Ab#BcQ5w%v2a$R0Jy5_;k&`o|@Uo;b zXFq>JnWOq*$VNdmy1fnK{d6$z>01oHa*P|Lsxou8xI4gt-SRryZfLLUcd%Edvt-pA_~AM!f)FB3P!9O$`upb|*Z~jSaD~~)hGu4T27{l* z^^Xdrypj?ZsJfw2sud*-cx~@Lb+rkf)xn=LsF#Hz%!0YQ3Ps`$trl=q8hXD5b_SPr zOeddwMqtY&dKP-F+7+7{KQ(n2N|H=_H3!-YFHs;UNt9+f#wI2t#Kd@70F>UEuDkFG zIhhC_BB!V6R$xAT*)upy&d})2uV25=X!L&4bs3a5 z%n*_;lG{m}tXGuL^@dpQZ!yyzetLR(8j^^cH_p(7!H0ucuVf-dL_GCxg&}Palv!wl znSIh`K-bsToqzR>bLh_Dy*%CX5RZ;KTPQm&`%AXoljri}$u{VeOrC|uw;l5fQhiu> z@gu0iTF@iGpkiqRYwAQs(D)W= z4%CNE${|ps?ZX{Bt6(_q{=Q}QGM5DO5+SL*UMK%1gY0h!btH|+tWn^W^bGVaM0ukk z1}CjjGW(NclO+$I;LYaQ``iU|akJx5b3N1dFc!1CwA}+}z6g z@mGU)q|^+qU(eKxKgU6b8(37^602wVF?Y*pJM&8kxxSC(IzY`0jDo3DQQx>V2Zkah zn`B2u=B6kwA!HHH>rivg$r+{VoyT}(=p<>?m6b!??ZyI2_v?y_dB4kEC_R1l?AgK2 z{6<~#1ONB8xAL;5=`q>DnF2O<$HIXC~da2K>|8~hQ_)Noo7yl>0u+!qt8#X-0 z#ZeG48)-p)j#&C4-#>6DQ35Ljz6i!?*5fj$i1_D)xCgauXi3TPzjqbD0VF_*6RIG2>%k<=DgXp(?>gtyIlCVJ>$)4ZzW7N$h@&5N z$iA`D@}qX#38IT1c0QcE+;evR_2j|h|9bxR@Z^_wFIv4Y=%=lBAD+EAI&AIi9UMIE z^+NyP;Q7h(*1I=H$0sdujDv$0Kku}5F4MI4=-}Y$>T2JUt@hh-S2pY)yi4MqpQJZ$ z#KHDNhy704*%7D7k3Mxd;(t3qJALxtyT_mXnlesy8XBt1s6#?=m{kB~iTwkUbT=p*K~{>Ko1#lwvc5+}3$UwfU1X5V(We(rkN*^HUS5Y+hp!f2{u}>1-Q@NVXYujhd4f=ngTMSmhwo?KR~-Fsi_qPc z?b5HeoJEd<_r4@(Uko=vEqCrgybmreYkd+Yaj%ZUKRzf^EL`^Zij9azhy@r zA$T~iw$tE?|HixVlcT8PUym<-!p}yLpGV!q)bq6SpFuw@bV!qde=uqD%xiy^Q*hMD zCZ(WVXga=#VN=s#&TgKPj*59UWiIK|K*Qud8?0*<~{i^QAaTrX_Ug~!A zyx3>-BkA<-9p29LW)ZT4TXLgiU57Wswy%aQFJy1s`V0z+Tr&WE0k(UZnC9Lcg##dE+ z-utB~Vbmj@p75&&vTRj3j*o;75%uHHOT7gHx&nO#__@{$0ILyLaard<7*1bSvB^9P z&IjT2MGtX)>2;=WYAt6evB`GNQhpkx;Z?e(*%p)Gf10G{ I}YPSH2wZG z@jKKsPcIVRkK~)PaNvtq(dx7#3@z`>rpANQo|km8e@6dx`e$2yPNfOpN9SH!xM0SE z2id9njJ8hO=SJ(AeO-=&*I)+1`IsB*ZF9q19I-labSNLn%-EZ1l{Y(^ZZf2DW8X5e zKgw)3`!fsNKIwh2QSW5U-ZOYq&jF1_=W9Rw;>#K5XMf-?kIxL0>9uJY;$K2&_F_5m zg;JiqIEH*-ENjBttO@5?6Vu3=h~DzWB3TnlLR%g;NQ7fJNW5?jZ<@lVv~3nf`HesbjM_ z%XQUHS&q}-q3q<-1|e?#hOIQBm+PIZ*&9>Vy`HjYJyRCt0_ItC#bO!YRl(eCFwEU- z4zcA+_GhmI^W}OcYxc%8w(>M)YVf=q8{_+Kj&Dq3bxvcXo@tEa?v{YLLxc}zGG#b7 z*Tp$_y6^z0!A8MzOL6dgI#=Ot$ITs%xH;nH>f`1Mos;|)d=lWS!qe>CUYkNJNBA#b zkWCqcfkD6^>KTMIfI%n~RwN;|dT-G(5%fgR6W-!1E$~{rMdG-+aL$2q;2bztvmQ?z zL*U$SMqwd!>+zP;^yn`!#(!k>=LlmK$teXPZzt&pw#G4QXJYQE?>i|dI8>Eb8-Gzz)}J;_Chtg=NrNZRpFLG*k|rD`}f$<*MS zv_JL*6;12&P39n@)F;d?`$cpSL{-<-iPMS;i=>R{8`0y9A6=xE6(^!Yhn2dHL7AZ1 z(uuQUta!2MRon}f?lU{?tE3C(>b^||(%ZS{i21l5-f-64HvA*Zrxe5z>kqurt-|WXqZ?W>(mRrHA zTsn4iOB`WUqM(MYnJ5T|0z?6#*!oh^mWhIxOfykX5Cw<=M6vZa^+KX3hQStxj2WAi zecMdAj@VTB;ud3fK%sK{$JfbJ2fkk`2>Er4OnLh32Xwd*g}cIEWt5)Ct1V^u1_)OV4oEh|jd?&$1H{%K8R!xeTcFqi=DWgW89g{RfOFs+I9IqVLo8GMrb3R3a2#r? z>W^E<@l9Rj;b!XCNH0Ko0p_ui#?U_D#H40zvzf~@fE_#J0qg*~p0y?F^5N11N6o?7 zOB2*Vttpl!bSzEqCM-;tBMu>0-rRsg7&rtRqMkz(5lACs+2w9Nrmasy)nIo`Lv@k& zvYdwM5=TfjI07_Op~}8>v1Pf}msXzO;0f>qc%t#5?2cxhFu@bx3GhT?HQ5ciElqZJ zx5XU|xt|tl0Pf#Lq!b&GE^dyENU;%VgEk@^oQZih&5pCePNZ~|ok%HmBE?Rm*okzT zJCQEVwlQRKT~^IQYGl}A)`*2SdhY3!|7|8f% zO(}lj1g`N-aSlhWJU9oOQ^`4!Z%hT0WAbl{avV?&C(PhZ!EUP`Ty(wN zoc`-&es>a5W0p#JL~g?1gTaTiic(sIQ5(+lD3)TFbHE%h2h3+-Zq|nKJaD8KQsU+}86W_UQQ`QnOK{2HRU8QlmanlLct%6UfsNkU^pm zY&h6(Wg$#fpLCdpfDA)!4`2?MtBSj3)vg*MG7NH{PzVIfRmENP1Z1$u$QFGrdrZ;@ z$UxQ+0hv3NIy3mXY;hk-&{2Yp5_FWH*It4y)A?2^J~vT(j^c9^pEt7jT)247xIO|d z!X|6Bt_v3dE`oa1=H#MZPeKkQ)`%S})ZT2$4i4A>?4X<-dcs(P4RhKIz!!6t#$6E+dmR9F-B;0J{3EG;99PB1Lq|T5oiJQM+D{=O6y^}S2 zgR_wqxfaZI)Hv7<+pC_wKbIMC~>e|pd2U%%GHQY$Q=3H=gMmwl)>B~sARgE zl}vZ52E=5Vd{T#D9>Y9_c}!JBt^~RcuhikdIdBe~tBE~jFxTOhIwoKam;>gD+)}yk zfgZmU3LEfC>-S5w3G_P%uVNm2zS8s^Zn&^=VdcWgRa85c8M(O) zAQO1h8M%f7BNs-lf(0Q@YQE7o2w!#fq=>a!r;D#Wo zP3mvB$|FkXlliS|b}A#{5A(VzS*dLdnWjFX8AizOG0`BJ1)>4bRPL(W??`f~-&1{^cXF*0EOu$yVl>n_-h@ zltiH<>YnejqXp)ud<4t^^YS(%q`uNeKF)1WR{3}bwt0q6b|1`DsdG8hF3*H66(;Z4 za5$h{4()PimqWW;mv(uc9k7yWxdYX5sFp*uypgKqGLd)R9B)K}guUh#ry*ev344`+ z3@^Fp(|Q({h&AR1>S9-eP5FU>AHWalcQufyyctQX_l&a5Uf?TND82z(GAM>Q z67B$Vz+6$_PNKYEw8N#}#HHtO>EY6=-$!y#WA2VQiuMtvO!Upd25e9nsb6Izi)L#X z-xT8;<6D8~qptA{l_-pFB^!hdHKL@f05O%RpjieqqPF3BQnRpCf_qP8%uNGi2pMz8 zm{)C;&>ct>bGDnWN*DKLsY%E@W1M{L>K-$W1I7X4fN|zBj%1k;;|w=yVKoxYXrq?< z$~PQ*1HJ*@%;y`kVBq9*L;hKxmX^iFQd)#4TeauVO@?kVbd#Z*4BcdHy2(<6Z7&k= z=&YojY&TpxIZXyNN+%mqh=wspCpSzwdGuVqY3XEc2&d7_);K6toSrpjZoG?`S=2F+ znT5{J#>Oe6I?VBTs6oQ^Aj_92;ex zDl(O6@ZFX*%r~lBjGK40%kfnu#HT<$i}86VuU_M-Kw+ujT#PJ2$t)U6A1jeid5z^( zsOXvpK3*~W7A*;`I^MZ$>mBbd#yiIQ0x9urk9X71I^LOq@s9C68Sk|2@lKiE@lG(_ zG2R!5&Mh48#RcPO zMO#Q^3H2IKPF$cIC(*|a?bRi97QcaIZ&=hSe`Pz+cGn)l5A&4u1c$fSSVXr z^7%Dl2{#)ZIzyftF5#9YhdBYyiV33JvU-wOL2h);M6vo2k`0b96Pqo6MyMD|-z)P3 z(Yy4`T<`>V0zA?5lmTKmBg1nj2dS1PxN(Pg;#SA;R-Rb)2+0OVXc$k-wd3bLsd={i z9Bcj-W?FO2m94bq+6dpk((4*$AH5z zfMd`=$AFVF2$eyo3_@kPgvy5c1uLnP@l{mH$URdj zGi?hhWerp*8$XwCTBVE{_E=TO#3qu<34y$R83w%-rg}&bK{%vA!XarQuDuuc{aZwc z*7go923aA<3V|IUE3`=!ATbQ}Wq^i-9qh4#J(g@{S;4wr)xHJ?%mH)2d=}Y9_c}$HsO%^QIgL4Ns2hM?WMZy)9CaF1t z0p@@?V6I4o%CI%ToC4;6Ibgm$ftp4XG0NR^h~a80Pa>{``XtmRp+0Hri(Ol;Pm=jD zdWpgYQGh5w6it^xqPA|LfMyzq0z}bxVFa0IJ6xE^DXwkslj~@zj4{AZ;HUa4V@#@Pd}BXXjBf?} z?M##~ZL-^PU1d3>1}5Npr-ezNg$XT8Xkp$JEzGfy)=FxaYzu0blfj=~WY<)Cr z4SqEUI(|PF$Q&KA8c~zZa)f(P+h4Kohra(JN`qwT0ZkrHt`-zTV!kQja*WD+4j3ef zxa#aikMF>|8z8@aaozKxj^Fts*LN)3x19A3#w}kaMeZt0+g!L^jOTG7%NB+ypV8+W z&kIw0GEoZ6zZduF%u8D=ucx$E`ll82=$9JVKpyElj;0isR~SDhWc ku7d~Bm(2d$!usDzIbupkHQ~! z$iBAI^1^o1@x#j>cRrlH*t2*3_2j|he>{78bo$G?=dE7g_mkGU4^LkoAGLP&4h{}` zy}&y-cy{`%_3riY$!Uupwm&ew;y#w|1ypSz5TcR-OJd$xClJ+@xic3t~D{OeVtzl)op6CT#LsCqa&wR za1?v#>7TiYH$L~UG1Z8%N5~#ET9iCu^bvDf|Eux8{Nct2iQ?J*uiQ@H-L^jY?axRHqtbiFW{y;FXec$Z%MgwV$aqxYkJ1Ha?-Uq|iF zUT5|^Z{8NplD7Wn_x^9+kxt8>cXl9e#RvW-O1$NN&)e9) z^uwi_zvGYMDIbQP`%ARtAClwnA{sXxVsdz$Cr_g!iMl_#F~5RQn;as?hrS3RH_4-K z{EbegKzT4hb9RPTQSAQ}g>JyF+Yi$xvgkyd!o&bBInmR@HWehS)`NBnc=?FaJf)%mNB!6E z!{blS4^RH&ZC>02*GDfGU;bQBC(4A8%|-In%sxAnJSnS7)&_H}Bg4*MSkZojPiNfh{#vlqG@Kg;(S z{YX0fdxy6(xt);f^e@O7@PkL6^DU;DWNn_s?sfh$zbk)!=@$pNTQqr}f1BOozV~Ys zb(ef>M{fAV?Pn84uFL3Vr}uh#bWVCrk<6se__>tyi-JKnJPiEHu;ltk+4ZG8PI_*e zA1K#{PglVc#?80%&A9n9zuybo+mp5%lw2BV`C;qFmUt;%+i+0yg(aHnIzepl2^R)w zZj>^e^QbMxDYbT6)Sexs<->F`POmtPmk-pD37DLEH%VDvZsaB0R0&GE1<`d`pZ8v2 zN*MKsrYHRJfh<~;j^ktQLxlY(a1(dIfG$B_4t|a~1Hf_wmR#0_9|Y5vm2WZ+gY!W+ zebGalU%8#>n_A0R3T#sCS&C1iFuV%aG}~e_{LkX#f}FWw-%tN(_bv%F=vg~zN3Qrv z*YxZ|e{e27Gws3OXBT`7CFjA}g?4rk`uw$h<#O{P(OS7d^ut%)vK<9c%$xpj7JD6P z7-yHU=Y`_Uc`)$!D{pny;f9ubZc**QS9 zC;c;W+&<}jxl!+U&E7M3l+OW;M&~Op_~MBf=Z!b;md9rb%H+l{HU2LlG<`8`@j|Jd zzSx?0VJvOJoV1Cqr%enkZNhtt7n7t-OaX0iTtDWH;UIQ{rGQ=&&Kcu4XNJJJZtS*n zLmJL$gK=(Y#4$Bnqhuw3-_b2zwVQHCuQIJ4MRDlG@7<0+m_1qgqwMJ)Hv3i`Fw`QJup)jjot11-vYnI}L`plg=TQ zcuD`Pm0-SH?|9ALn8sF~#ta3Xmu+EuZ|C^NG*;&{M(UZyNak*FnA?Q=Uxi2pZZ1D=zR)?zZowxG&N4jB-tDz1#I(8p0tVTX zK^PbW3?iRFNCOyzQf@^OV#)UwO#?ws1U=y`&eDQji?>K@M-|R>;2byy&gHDf6IY9_c}&hCeQK{NfjI@t z0dv4y&LU=Nu4cIklC4z}xeCa|soh#778xzlJHr5stN~82NMFGN6s(lx3d%J@m=14x zJH2U`A=?)nH*`fPH-K`W94MC)8y9oAio9rpz}G-tG*B)lawz6emZqUz*eWeOw{Uw!@gv{hJ$(%!JHMi@PwN6jjB4u4t zy}A{$wLkja^-|3jJ!gJB(I8p;qz^;Co70nAl*lStwEegp{p^R&rc|niW0On`&Pn?d zk5kdKKHp>x(h7Zo^s=9amws4wU7aW?xv)^kn7-ycUVGtXa#eC7I&@g6V{4Rgsx6#2 zJ;sU`n_Nddf9XE6L+CiXZ&T* z<`a-t)HnMO`hO0*Jb5p?qL0fl!sLe5C?hy~bF0-6GKJIDRhoUPo}Q zE%s9ARhLaqqmxW^%AKOrv?&^m#r0-mfp<9XYL~MeORdM;Q)9X|Yd_AjAj=)Rg0EO; zHrHP)wk-DfG8?oN~)MBh`|&S1qD%nC_ogI$Eg<*MLrC+IAqM&tnAxn z%5}t|(igWF+X98k@t?jK3(aRY11@bO0SdF95xsWo&AR zs(`G{O=dYw?) zldrbt{`Q;x`|rPz-y0yhM@*_}Qe;R{Mv^j&21!Okx;R8_s=&RY$WyND0mACr-0CB+ z`e5~a(^j9@Y)XyMr@`oh(FdbX*5aM2h$qGVa=aQ&amOy zt?k-TxOQ;uRJnFdh~|qJQD*Onc|e}MN07n+^)T3b1!g$=r^DPE`dS{x-D!hz9Eq)}I3Fk36DHu>R7#FctFvb+E)+#XKOU0b(f- z40H%eEl_F!^IhVyj2fJ4z&UUZoJ(AmA*LaJOCj4qI1Uw6^~Wv5_@<8Za5J?nq!%E) z0P|QuVQ8P|#GpoPvzfybfF1ke0qg*~nzbeB=)4&$7VGLZItO(}l-1djGiagL5$d2kLm zr<8L9-xv}o$I!nm%CSK?pd3(68Rc-gAvH6OMMg3S#1R!t#FV9%qg#lTS0#8v(!~yr z7s)B5AH7(tWCiy|Hb*y+SBkt+>3OAHw?`j#2fMAlf7x|+Gy1QW`JG8fjhQm#5p@Fw z9}GUERTR=HwAyfK- zPeKkQ=7=3k)ZT2$4mQ{U>>!;TdfZxnm{LSNg*KEL6Y(0IeH&HXj)lc$EHBjKisCuk`ua(xk6|9e zJSM9mR{&jwS8D6PIdBe~%ZWXuFjwK0+6G__m;>gL+)}acff~OQ3LEfC>-S5Q3G~|t zuVNmsY3vBz#K4_6MRY)`c*ik4uew)r?h^jbhpKF zyM;1C*7!CY;_bc zrHk#EVd*N^p1D(>l}oaPeW~d?y5_*jg_R2{S5oa*YUE}%fJoqxXXI)&j9eJG5;nYa zMhR-LaW}PbHLUi)##ON6rF&CjMWqRDsDvA^(gSW#zzu#_o7CTMl}Dtw-$z+@UDIKL zL)IO#?$eBN_D_e!y~ywLH+pT{!flWH%`I5N0=Ix$X1HZ1-7{jRHde9deI^xZW7jK? z3P`0uDud9!*r`nmIjetk98N0KkhVNPQT|v>`D#|`pkXg}?B$LC*Y*XtF6uEB4LW27 zYJ(ZDk2{!Q`iVs}^)wc8SPlyz-=YLanKoLU-oa)*-%C-Ym`>{LX= zA7*t`qEcHMGEIF%GmMbmW1>Mc3q%8=Dcx1M-x1_ezcrHu%#B+2btGb#H`CQ!m|!h)Whq&q6NJV(Hk*y~0#-i(!*zltiH<>YnejqXg!td<4t^ z^Wrunq`uNeeVp4Mt@3dTwt0q6b|1`Dp>sLZE>DFnB_{7!a5$h{4()PimqWW;m3DcS z9k7yWxee8FsFp*uypgKqB9V9B7;i*_guUh#ry*ev345i13^%^)(|Q({h&kp5>R?xc zP5FU>AHWatcQp{HyeUc4vjj~HHcqRPytH9pX#-0eSlW;z>X_nOvlZYRTND82zI{_VQi(dPFK6O_e`SU;w}XfB_(B zE3y>lO8j{ZI0w#wb2)K40dp1ZyotgCpd2WdEY7L-$!y#WA2VIiuMsEP4vyg25e9nsb6Izjbzt=j9*O@?kVbd#Z*4Bcd9y2(O>Z7<~T=&YojY&BdvIf(}~N+)YV zh=wspCpSzwdGuVqY3XEL<4&WKu5nN*IX!F6+_;UIS=2U=nT56uv<{Cxb|KRV~Z z!`p=}Uv@h_aiA_^2(RxT>TJX(Oaq^+&nL+A1fR&~liSw+1j!G3BVKuU(*#a&#wLml zMp>Uxu&)CcMLwh4NFtEA_c<~ zF2`4;5T641EXL=dynKzT1cil$b1||AC9`NOd@Mym=`|Kxp`vRZ`1F$Dw`fUl)$y)d zmfG>|V7z0zFOU+idb}H&((%qTjCYLp$#|!Ak9W${j(39bj`6-gbZ+5z&o7wY;T+HA zmaHACU78XO~r8kD2%5hw@BC2b*aw&-h>5b5C7)j-mT=S2p)%yT;Sz3P za+nkFESVsREz2i~734QB!GqKs?XM~Ee^u01q5VcF+%mGh;C%_X;PZ=PZ zJu*Cpa*%R)Lf5v4C+>6{@8pSPj}UKggog3NTswa5lbUDC&#~t3V5T+KT-i!%u8r^w zOtr3oPBGv4wwVxfcY%Uje20NnWF_+odez`(u(?_-GSYV zCG3W45>@7^g?S9~80IlK;xuWnTn)}`;2byy&Ls&~n2Mz4GzORh=76~*6)MeA1ak_Q z1LlBvbpkbwC}I@5=@89PR-Qy06ZJ``PeOfC<%?Yv*C&bm7_~%Ufha%}Ad03-AyG>; zQ9v^dL;<2`yfA`Dv>h%?r1ELfYo3YYpy(Mz&kZbkCXP{A)w457W09;{k7WVG3o)xo z%2pHJxeAoqNIeJ2fpTeE&?rJVGWLLSpj^`C6v8ha3Kh+9i|c|p_Mk!LdHtE^+#zMw zSiOOdacSdQhZI*8{N&h*Dq}S86ZonA${2$x8sFH@72{h1f7=r!OpENc97kFXsfG#o z-f3YHXkkJN6Iz(tqJ=pY(ppIklU1OGIT`%fMRwgdN$)_H-{6-6zvJ~Yfy~h%%Mmr{ zEJnB+w!Ibme&~D8!^DrL9?<0RWNJZv$mg3pF2|_M=72#Q^Q%s8^!N_U(GE>JJiqC= zVaMzIk?A|;?pwxs2jiA6;yicdw~jJ}_#@3k%7|%k(^Q{P=p4@sQ;agv3eCRfckA4Z z@A&$Y-^pQg?i`*)45Qvj;GVzoM6_(uCmoc!m9y4{#M$@H1Mj_ena9-RhwhP)45?{y zOU2@*O7TZd>2MCYZRR|p$wxOB6z+9#vKbznzYN;RAf8cID;&P;zow|Y?AU|zzLz8^ zek(tCIjE~ScA0o?HAn8cJ-Xy!=?aJK@#F3d!jQwLQ^QrKhp+44e)uJ|KsPyXj%SC| VJ9+H|oHL(1_ Date: Thu, 11 Feb 2016 08:15:22 -0600 Subject: [PATCH 016/104] Typos from @dmi3kno. Fixes #26 --- transform.Rmd | 16 ++++++++-------- 1 file changed, 8 insertions(+), 8 deletions(-) diff --git a/transform.Rmd b/transform.Rmd index 85433e7..4aed1b8 100644 --- a/transform.Rmd +++ b/transform.Rmd @@ -24,7 +24,7 @@ When working with data you must: 1. Figure out what you want to do. 1. Precisely describe what you want to do in such a way that the - compute can understand it (i.e. program it). + computer can understand it (i.e. program it). 1. Execute the program. @@ -67,7 +67,7 @@ It prints differently because it has a different "class" to usual data frames: class(flights) ``` -This is called a `tbl_df` (pronounced tibble diff) or a `data_frame` (pronounced "data underscore frame"; cf. `data dot frame`). Generally, however, we want worry about this relatively minor difference and will refer to everything as data frames. +This is called a `tbl_df` (pronounced "tibble diff") or a `data_frame` (pronounced "data underscore frame"; cf. `data dot frame`). Generally, however, we won't worry about this relatively minor difference and will refer to everything as data frames. You'll learn more about how that works in data structures. If you want to convert your own data frames to this special case, use `as.data_frame()`. I recommend it for large data frames as it makes interactive exploration much less painful. @@ -83,7 +83,7 @@ There are two other important differences between tbl_dfs and data.frames: * When you subset a tbl\_df with `[`, it always returns another tbl\_df. Contrast this with a data frame: sometimes `[` returns a data frame and - sometimes it just returns a single column: + sometimes it just returns a single column (i.e. a vector): ```{r} df1 <- data.frame(x = 1:3, y = 3:1) @@ -95,7 +95,7 @@ There are two other important differences between tbl_dfs and data.frames: class(df2[, 1]) ``` - To extract a single column use `[[` or `$`: + To extract a single column from a tbl\_df use `[[` or `$`: ```{r} class(df2[[1]]) @@ -211,7 +211,7 @@ Multiple arguments to `filter()` are combined with "and". To get more complicate filter(flights, month == 11 | month == 12) ``` -Note the order isn't like English. This expression doesn't find on months that equal 11 or 12. Instead it finds all months that equal `11 | 12`, which is `TRUE`. In a numeric context (like here), `TRUE` becomes one, so this finds all flights in January, not November or December. +Note the order isn't like English. The following expression doesn't find on months that equal 11 or 12. Instead it finds all months that equal `11 | 12`, which is `TRUE`. In a numeric context (like here), `TRUE` becomes one, so this finds all flights in January, not November or December. ```{r, eval = FALSE} filter(flights, month == 11 | 12) @@ -393,7 +393,7 @@ rename(flights, tail_num = tailnum) -------------------------------------------------------------------------------- -This function works similarly to the `select` argument in `base::subset()`. Because the dplyr philosophy is to have small functions that do one thing well, it is its own function in dplyr. +The `select()` function works similarly to the `select` argument in `base::subset()`. Because the dplyr philosophy is to have small functions that do one thing well, it is its own function in dplyr. -------------------------------------------------------------------------------- @@ -566,7 +566,7 @@ by_day <- group_by(flights, year, month, day) summarise(by_day, delay = mean(dep_delay, na.rm = TRUE)) ``` -Together `group_by()` and `summarise()` provide one of tools that you'll use most commonly when working with dplyr: grouped summaries. But before we go any further with this idea, we need to introduce a powerful new idea: the pipe. +Together `group_by()` and `summarise()` provide one of tools that you'll use most commonly when working with dplyr: grouped summaries. But before we go any further with this, we need to introduce a powerful new idea: the pipe. ### Combining multiple operations with the pipe @@ -774,7 +774,7 @@ Just using means, counts, and sum can get you a long way, but R provides many ot ``` * By position: `first(x)`, `nth(x, 2)`, `last(x)`. These work similarly to - `x[1]`, `x[length(x)]`, and `x[n]` but let you set a default value if that + `x[1]`, x[n], and `x[length(x)]` but let you set a default value if that position does not exist (i.e. you're trying to get the 3rd element from a group that only has two elements). From 302528634ebe630fd278914cebe4e0134b345ecb Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 11 Feb 2016 08:17:17 -0600 Subject: [PATCH 017/104] Fix exercise indenting. Closes #16 --- visualize.Rmd | 26 ++++++++++++++------------ 1 file changed, 14 insertions(+), 12 deletions(-) diff --git a/visualize.Rmd b/visualize.Rmd index ba87b57..959b2ba 100644 --- a/visualize.Rmd +++ b/visualize.Rmd @@ -708,19 +708,21 @@ ggplot(data = mpg) + ##### Exercises -1. What graph will this code make? -```{r eval = FALSE} -ggplot(data = mpg) + - geom_point(mapping = aes(x = displ, y = hwy)) + - facet_grid(drv ~ .) -``` +1. What graph will this code make? -1. What graph will this code make? -```{r eval = FALSE} -ggplot(data = mpg) + - geom_point(mapping = aes(x = displ, y = hwy)) + - facet_grid(. ~ cyl) -``` + ```{r eval = FALSE} + ggplot(data = mpg) + + geom_point(mapping = aes(x = displ, y = hwy)) + + facet_grid(drv ~ .) + ``` + +1. What graph will this code make? + + ```{r eval = FALSE} + ggplot(data = mpg) + + geom_point(mapping = aes(x = displ, y = hwy)) + + facet_grid(. ~ cyl) + ``` ### The layered grammar of graphics From 55ec3898a2a3408e64b472463340dce513d86ca2 Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 11 Feb 2016 08:20:13 -0600 Subject: [PATCH 018/104] Also need lubridate --- DESCRIPTION | 1 + 1 file changed, 1 insertion(+) diff --git a/DESCRIPTION b/DESCRIPTION index 449a7f4..4e29f6a 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -19,6 +19,7 @@ Imports: jpeg, jsonlite, Lahman, + lubridate, knitr, maps, microbenchmark, From 97804e042f01a034849301587ecebf7221442f0c Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 11 Feb 2016 09:39:22 -0600 Subject: [PATCH 019/104] Use language:R --- .travis.yml | 40 ++++++---------------------------------- 1 file changed, 6 insertions(+), 34 deletions(-) diff --git a/.travis.yml b/.travis.yml index 614ad68..dbb4436 100644 --- a/.travis.yml +++ b/.travis.yml @@ -1,45 +1,17 @@ -language: c -sudo: false +language: R +cache: + packages: [] + directores: [vendor/bundle] addons: apt: - sources: - - r-packages-precise packages: - - r-base-dev - - r-recommended - libxml2-dev -env: - global: - - R_LIBS_USER=$HOME/R/library - -cache: - directories: - - $R_LIBS_USER - - vendor/bundle - - $HOME/.ccache - -install: - # Install binary pandoc from Rstudio - - mkdir $HOME/pandoc - - curl -O https://s3.amazonaws.com/rstudio-buildtools/pandoc-1.12.3.zip - - unzip -j pandoc-1.12.3.zip pandoc-1.12.3/linux/debian/x86_64/pandoc - -d $HOME/pandoc - - chmod +x $HOME/pandoc/pandoc - - rm pandoc-1.12.3.zip - - export PATH="$HOME/pandoc:$PATH" - - pandoc --version - - # Install ruby gems +# Install ruby gems +before_script: - bundle install --jobs=3 --retry=3 --deployment - # Install R packages - - mkdir -p "$R_LIBS_USER" - - Rscript -e 'if (length(find.package("devtools", quiet = TRUE)) == 0L) { install.packages("devtools", repos = "http://cran.rstudio.com") }' - - Rscript -e 'devtools::install_github("hadley/devtools")' - - Rscript -e 'devtools::install_deps(repos = "http://cran.rstudio.com", dependencies = TRUE)' - script: bundle exec jekyll build after_success: From 59f09dd8a96a1c2b043c9af6ecdbf1779f3445aa Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 11 Feb 2016 10:44:49 -0600 Subject: [PATCH 020/104] Tweak cache spec --- .travis.yml | 5 +++-- 1 file changed, 3 insertions(+), 2 deletions(-) diff --git a/.travis.yml b/.travis.yml index dbb4436..d650962 100644 --- a/.travis.yml +++ b/.travis.yml @@ -1,7 +1,8 @@ language: R cache: - packages: [] - directores: [vendor/bundle] + packages: true + directores: + - vendor/bundle addons: apt: From 504c3c44b473fae57922e74b7c27f0323b763049 Mon Sep 17 00:00:00 2001 From: Radu Grosu Date: Thu, 11 Feb 2016 17:45:33 +0000 Subject: [PATCH 021/104] Update strings.Rmd typos --- strings.Rmd | 78 ++++++++++++++++++++++++++--------------------------- 1 file changed, 39 insertions(+), 39 deletions(-) diff --git a/strings.Rmd b/strings.Rmd index 991cbfc..402be2c 100644 --- a/strings.Rmd +++ b/strings.Rmd @@ -37,7 +37,7 @@ single_quote <- '\'' # or "'" That means if you want to include a literal `\`, you'll need to double it up: `"\\"`. -Beware that the printed representation of the string is not the same as string itself, because the printed representation shows the escapes. To see the raw contents of the string, use writeLines()`: +Beware that the printed representation of the string is not the same as string itself, because the printed representation shows the escapes. To see the raw contents of the string, use `writeLines()`: ```{r} x <- c("\"", "\\") @@ -45,7 +45,7 @@ x writeLines(x) ``` -There are a handful of other special characters. The most common used are `"\n"`, new line, and `"\t"`, tab, but you can see the complete list by requesting help on `"`: `?'"'`, or `?"'"`. You'll also sometimes strings like `"\u00b5"`, this is a way of writing non-English characters that works on all platforms: +There are a handful of other special characters. The most common used are `"\n"`, newline, and `"\t"`, tab, but you can see the complete list by requesting help on `"`: `?'"'`, or `?"'"`. You'll also sometimes see strings like `"\u00b5"`, this is a way of writing non-English characters that works on all platforms: ```{r} x <- "\u00b5" @@ -54,7 +54,7 @@ x ### String length -Base R contains many functions to work with strings but we'll generally avoid them because they're inconsistent and hard to remember. Their behaviour is particularly inconsistent when it comes to missing values. For examle, `nchar()`, which gives the length of a string, returns 2 for `NA` (instead of `NA`) +Base R contains many functions to work with strings but we'll generally avoid them because they're inconsistent and hard to remember. Their behaviour is particularly inconsistent when it comes to missing values. For example, `nchar()`, which gives the length of a string, returns 2 for `NA` (instead of `NA`) ```{r} # Bug will be fixed in R 3.3.0 @@ -147,7 +147,7 @@ x ### Locales -Above I used`str_to_lower()` to change to lower case. You can also use `str_to_upper()` or `str_to_title()`. However, changing case is more complicated than it might at first seem because different languages have different rules for changing case. You can pick which set of rules to use by specifying a locale: +Above I used `str_to_lower()` to change to lower case. You can also use `str_to_upper()` or `str_to_title()`. However, changing case is more complicated than it might at first seem because different languages have different rules for changing case. You can pick which set of rules to use by specifying a locale: ```{r} # Turkish has two i's: with and without a dot, and it @@ -158,7 +158,7 @@ str_to_upper(c("i", "ı"), locale = "tr") The locale is specified as ISO 639 language codes, which are two or three letter abbreviations. If you don't already know the code for your language, [Wikipedia](https://en.wikipedia.org/wiki/List_of_ISO_639-1_codes) has a good list. If you leave the locale blank, it will use the current locale. -Another important operation that's affected by the locale is sorting. The base R `order()` and `sort()` functions sort strings using the currect locale. If you want robust behaviour across different computers, you may want to use `str_sort()` and `str_order()` which take an additional `locale` argument: +Another important operation that's affected by the locale is sorting. The base R `order()` and `sort()` functions sort strings using the current locale. If you want robust behaviour across different computers, you may want to use `str_sort()` and `str_order()` which take an additional `locale` argument: ```{r} x <- c("apple", "eggplant", "banana") @@ -191,9 +191,9 @@ str_sort(x, locale = "haw") # Hawaiian Regular expressions, regexps for short, are a very terse language that allow to describe patterns in strings. They take a little while to get your head around, but once you've got it you'll find them extremely useful. -To learn regular expressions, we'll use `str_show()` and `str_show_all()`. These functions take a character vector and a regular expression, and shows you how they match. We'll start with very simple regular expressions and then gradually get more and more complicated. Once you've mastered pattern matching, you'll learn how to apply those ideas with various stringr functions. +To learn regular expressions, we'll use `str_show()` and `str_show_all()`. These functions take a character vector and a regular expression, and show you how they match. We'll start with very simple regular expressions and then gradually get more and more complicated. Once you've mastered pattern matching, you'll learn how to apply those ideas with various stringr functions. -### Basics matches +### Basic matches The simplest patterns match exact strings: @@ -202,7 +202,7 @@ x <- c("apple", "banana", "pear") str_view(x, "an") ``` -The next step up in complexity is `.`, which matches any character (except a new line): +The next step up in complexity is `.`, which matches any character (except a newline): ```{r, cache = FALSE} str_view(x, ".a.") @@ -254,7 +254,7 @@ str_view(x, "^a") str_view(x, "a$") ``` -To remember which is which, try this mneomic which I learned from [Evan Misshula](https://twitter.com/emisshula/status/323863393167613953): if you begin with power (`^`), you end up with money (`$`). +To remember which is which, try this mnemonic which I learned from [Evan Misshula](https://twitter.com/emisshula/status/323863393167613953): if you begin with power (`^`), you end up with money (`$`). To force a regular expression to only match a complete string, anchor it with both `^` and `$`.: @@ -289,7 +289,7 @@ You can also match the boundary between words with `\b`. I don't find I often us There are number of other special patterns that match more than one character: -* `.`: any character apart from a new line. +* `.`: any character apart from a newline. * `\d`: any digit. * `\s`: any whitespace (space, tab, newline). * `[abc]`: match a, b, or c. @@ -303,7 +303,7 @@ You can use _alternation_ to pick between one or more alternative patterns. For str_view(c("abc", "xyz"), "abc|xyz") ``` -Like with mathematical expression, if precedence ever gets confusing, use parentheses to make it clear what you want: +Like with mathematical expressions, if precedence ever gets confusing, use parentheses to make it clear what you want: ```{r, cache = FALSE} str_view(c("grey", "gray"), "gr(e|a)y") @@ -315,7 +315,7 @@ str_view(c("grey", "gray"), "gr(e|a)y") 1. Start with a vowel. - 1. That only contain constants. (Hint: thinking about matching + 1. That only contain consonants. (Hint: thinking about matching "not"-vowels.) 1. End with `ed`, but not with `eed`. @@ -348,12 +348,12 @@ By default these matches are "greedy": they will match the longest string possib ```{r} ``` -Note that the precedence of these operators are high, so you can write: `colou?r` to match either American or British spellings. That means most uses will need parentheses, like `bana(na)+` or `ba(na){2,}`. +Note that the precedence of these operators is high, so you can write: `colou?r` to match either American or British spellings. That means most uses will need parentheses, like `bana(na)+` or `ba(na){2,}`. #### Exercises 1. Describe in words what these regular expressions match: - (read carefully to see I'm using a regular expression or a string + (read carefully to see if I'm using a regular expression or a string that defines a regular expression.) 1. `^.*$` @@ -364,12 +364,12 @@ Note that the precedence of these operators are high, so you can write: `colou?r 1. Create regular expressions to find all words that: 1. Have three or more vowels in a row. - 1. Start with three consonants - 1. Have two or more vowel-consontant pairs in a row. + 1. Start with three consonants. + 1. Have two or more vowel-consonant pairs in a row. ### Grouping and backreferences -You learned about parentheses earlier as a way to disambiguate complex expression. They do one other special thing: they also define numeric groups that you can refer to with _backreferences_, `\1`, `\2` etc.For example, the following regular expression finds all fruits that have a pair letters that's repeated. +You learned about parentheses earlier as a way to disambiguate complex expression. They do one other special thing: they also define numeric groups that you can refer to with _backreferences_, `\1`, `\2` etc.For example, the following regular expression finds all fruits that have a pair of letters that's repeated. ```{r, cache = FALSE} str_view(fruit, "(..)\\1", match = TRUE) @@ -400,15 +400,15 @@ str_detect(c("grey", "gray"), "gr(?:e|a)y") ## Tools -Now that you've learned the basics of regular expression, it's time to learn how to apply to real problems. In this section you'll learn a wide array of stringr functions that let you: +Now that you've learned the basics of regular expressions, it's time to learn how to apply them to real problems. In this section you'll learn a wide array of stringr functions that let you: * Determine which elements match a pattern. * Find the positions of matches. * Extract the content of matches. * Replace matches with new values. -* How can you split a string into based on a match. +* How can you split a string based on a match. -Because regular expressions are so powerful, it's easy to try and solve every problem with a single regular expression. But since you're in a programming language, it's often easy to break the problem down into smaller pieces. If you find yourself getting stuck trying to create a single regexp that solves your problem, take a step back and think if you could break the problem down in to smaller pieces, solving each challenge before moving onto the next one. +Because regular expressions are so powerful, it's easy to try and solve every problem with a single regular expression. But since you're in a programming language, it's often easy to break the problem down into smaller pieces. If you find yourself getting stuck trying to create a single regexp that solves your problem, take a step back and think if you could break the problem down into smaller pieces, solving each challenge before moving onto the next one. ### Detect matches @@ -419,7 +419,7 @@ x <- c("apple", "banana", "pear") str_detect(x, "e") ``` -Remember that when you use a logical vector in a numeric context, `FALSE` becomes 0 and `TRUE` becomes 1. That makes `sum()` and `mean()` useful if you want answer questions about matches across a larger vector: +Remember that when you use a logical vector in a numeric context, `FALSE` becomes 0 and `TRUE` becomes 1. That makes `sum()` and `mean()` useful if you want to answer questions about matches across a larger vector: ```{r} # How many common words start with t? @@ -438,7 +438,7 @@ no_vowels_2 <- str_detect(common, "^[^aeiou]+$") all.equal(no_vowels_1, no_vowels_2) ``` -The results are identical, but I think the first approach is significantly easier to understand. So if you find your regular expression is getting overly complicated, try breaking it up into smaller pieces, giving each piece a name, and then combining with logical operations. +The results are identical, but I think the first approach is significantly easier to understand. So if you find your regular expression is getting overly complicated, try breaking it up into smaller pieces, giving each piece a name, and then combining them with logical operations. A common use of `str_detect()` is to select the elements that match a pattern. You can do this with logical subsetting, or the convenient `str_subset()` wrapper: @@ -468,7 +468,7 @@ Note the use of `str_view_all()`. As you'll shortly learn, many stringr function ### Exercises -1. For each of the following challenges, try solving it both a single +1. For each of the following challenges, try solving it by using both a single regular expression, and a combination of multiple `str_detect()` calls. 1. Find all words that start or end with `x`. @@ -483,7 +483,7 @@ Note the use of `str_view_all()`. As you'll shortly learn, many stringr function ### Extract matches -To extract the actual text of a match, use `str_extract()`. To show that off, we're going to need a more complicated example. I'm going to use the [Harvard sentences](https://en.wikipedia.org/wiki/Harvard_sentences), which were designed to tested VOIP systems, but are also useful for practicing regexs. +To extract the actual text of a match, use `str_extract()`. To show that off, we're going to need a more complicated example. I'm going to use the [Harvard sentences](https://en.wikipedia.org/wiki/Harvard_sentences), which were designed to test VOIP systems, but are also useful for practicing regexes. ```{r} length(sentences) @@ -543,7 +543,7 @@ str_extract_all(x, "[a-z]", simplify = TRUE) ### Grouped matches -Earlier in this chapter we talked about the use of parentheses for clarifying precedence and to use with backreferences when matching. You can also parentheses to extract parts of a complex match. For example, imagine we want to extract nouns from the sentences. As a heuristic, we'll look for any word that comes after "a" or "the". Defining a "word" in a regular expression is a little tricky. Here I use a sequence of at least one character that isn't a space. +Earlier in this chapter we talked about the use of parentheses for clarifying precedence and for backreferences when matching. You can also use parentheses to extract parts of a complex match. For example, imagine we want to extract nouns from the sentences. As a heuristic, we'll look for any word that comes after "a" or "the". Defining a "word" in a regular expression is a little tricky. Here I use a sequence of at least one character that isn't a space. ```{r} noun <- "(a|the) ([^ ]+)" @@ -607,7 +607,7 @@ sentences %>% #### Exercises -1. Replace all `/` in a string with `\`. +1. Replace all `/`'s in a string with `\`'s. ### Splitting @@ -619,7 +619,7 @@ sentences %>% str_split(" ") ``` -Because each component might contain a different number of pieces, this returns a list. If you're working with a length-1 vector, the easiest thing is to just extra the first element of the list: +Because each component might contain a different number of pieces, this returns a list. If you're working with a length-1 vector, the easiest thing is to just extract the first element of the list: ```{r} "a|b|c|d" %>% @@ -635,7 +635,7 @@ sentences %>% str_split(" ", simplify = TRUE) ``` -You can also request a maximum number of pieces; +You can also request a maximum number of pieces: ```{r} fields <- c("Name: Hadley", "County: NZ", "Age: 35") @@ -657,7 +657,7 @@ str_split(x, boundary("word"))[[1]] 1. Split up a string like `"apples, pears, and bananas"` into individual components. -1. Why is it's better to split up by `boundary("word")` than `" "`? +1. Why is it better to split up by `boundary("word")` than `" "`? 1. What does splitting with an empty string (`""`) do? @@ -697,7 +697,7 @@ You can use the other arguments of `regex()` to control details of the match: ``` * `comments = TRUE` allows you to use comments and white space to make - complex regular expressions more understand. Space are ignored, as is + complex regular expressions more understandable. Spaces are ignored, as is everything after `#`. To match a literal space, you'll need to escape it: `"\\ "`. @@ -707,7 +707,7 @@ There are three other functions you can use instead of `regex()`: * `fixed()`: matches exactly the specified sequence of bytes. It ignores all special regular expressions and operates at a very low level. - This allows you to avoid complex escaping can be much faster than + This allows you to avoid complex escaping and can be much faster than regular expressions: ```{r} @@ -732,7 +732,7 @@ There are three other functions you can use instead of `regex()`: ``` They render identically, but because they're defined differently, - `fixed()` does find a match. Instead, you can use `coll()`, defined + `fixed()` doesn't find a match. Instead, you can use `coll()`, defined next to respect human character comparison rules: ```{r} @@ -764,12 +764,12 @@ There are three other functions you can use instead of `regex()`: stringi::stri_locale_info() ``` - The downside of `coll()` is because the rules for recognising which + The downside of `coll()` is speed; because the rules for recognising which characters are the same are complicated, `coll()` is relatively slow compared to `regex()` and `fixed()`. * As you saw with `str_split()` you can use `boundary()` to match boundaries. - You can also use it with the other functions, all though + You can also use it with the other functions: ```{r, cache = FALSE} x <- "This is a sentence." @@ -788,7 +788,7 @@ There are three other functions you can use instead of `regex()`: There are a few other functions in base R that accept regular expressions: -* `apropos()` searchs all objects avaiable from the global environment. This +* `apropos()` searches all objects available from the global environment. This is useful if you can't quite remember the name of the function. ```{r} @@ -796,7 +796,7 @@ There are a few other functions in base R that accept regular expressions: ``` * `dir()` lists all the files in a directory. The `pattern` argument takes - a regular expression and only return file names that match the pattern. + a regular expression and only returns file names that match the pattern. For example, you can find all the rmarkdown files in the current directory with: @@ -818,9 +818,9 @@ There are a few other functions in base R that accept regular expressions: ### The stringi package -stringr is built on top of the __stringi__ package. stringr is useful when you're learning because it exposes a minimal set of functions, that have been carefully picked to handle the most common string manipulation functions. stringi on the other hand is designed to be comprehensive. It contains almost every function you might ever need. stringi has `length(ls("package:stringi"))` functions to stringr's `length(ls("package:stringr"))`. +stringr is built on top of the __stringi__ package. stringr is useful when you're learning because it exposes a minimal set of functions, that have been carefully picked to handle the most common string manipulation functions. stringi on the other hand is designed to be comprehensive. It contains almost every function you might ever need. stringi has `r length(ls("package:stringi"))` functions to stringr's `r length(ls("package:stringr"))`. -So if you find yourself struggling to do something that doesn't seem natural in stringr, it's worth taking a look at stringi. The use of the two packages are very similar because stringr was designed to mimic stringi's interface. The main difference is the prefix: `str_` vs `stri_`. +So if you find yourself struggling to do something that doesn't seem natural in stringr, it's worth taking a look at stringi. The use of the two packages is very similar because stringr was designed to mimic stringi's interface. The main difference is the prefix: `str_` vs `stri_`. ### Encoding @@ -832,7 +832,7 @@ Complicated and fraught with difficulty. Best approach is to convert to UTF-8 as Generally, you should fix encoding problems during the data import phase. -Detect encoding operates statistically, by comparing frequency of byte fragments across languages and encodings. Fundamentally heuristic and works better with larger amounts of text (i.e. a whole file, not a single string from that file). +Detect encoding operates statistically, by comparing frequency of byte fragments across languages and encodings. It's fundamentally heuristic and works better with larger amounts of text (i.e. a whole file, not a single string from that file). ```{r} x <- "\xc9migr\xe9 cause c\xe9l\xe8bre d\xe9j\xe0 vu." From 27cc6617bb5ee0b97754de01f71d620b2293d8e5 Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 11 Feb 2016 16:31:22 -0600 Subject: [PATCH 022/104] Use new bookdown yml --- _bookdown.yml | 24 ++++++++++++++++++++++++ _config.yml | 20 -------------------- 2 files changed, 24 insertions(+), 20 deletions(-) create mode 100644 _bookdown.yml diff --git a/_bookdown.yml b/_bookdown.yml new file mode 100644 index 0000000..4dc0c17 --- /dev/null +++ b/_bookdown.yml @@ -0,0 +1,24 @@ +rmd_files: [ + "understand.Rmd", + "visualize.Rmd", + "transform.Rmd", + "model.Rmd", + "variation.Rmd", + "work.Rmd", + "import.Rmd", + "tidy.Rmd", + "relational-data.Rmd", + "strings.Rmd", + "datetimes.Rmd", + "program.Rmd", + "functions.Rmd", + "data-structures.Rmd", + "lists.Rmd", + "robust-code.Rmd", + "science.Rmd", + "model-vis.Rmd", + "model-assess.Rmd", + "communicate.Rmd", + "rmarkdown.Rmd", + "shiny.Rmd", +] diff --git a/_config.yml b/_config.yml index 5fcbebf..317ff8b 100644 --- a/_config.yml +++ b/_config.yml @@ -3,23 +3,3 @@ markdown: redcarpet highlighter: pygments exclude: ["CONTRIBUTING.md", "README.md", "book", "vendor"] - -# rmd_files: [ -# "index.Rmd", -# "intro.Rmd", -# "visualize.Rmd", -# "transform.Rmd", -# "tidy.Rmd", -# "model.Rmd", -# "import.Rmd", -# "eda.Rmd", -# "rmarkdown.Rmd", -# "shiny.Rmd", -# "data-structures.Rmd", -# "functions.Rmd", -# "strings.Rmd", -# "datetimes.Rmd", -# "lists.Rmd", -# "model-vis.Rmd", -# "model-assess.Rmd", -# ] From d69eeff57e34a0b0e28720f96dc99ef247044e45 Mon Sep 17 00:00:00 2001 From: hadley Date: Thu, 11 Feb 2016 16:31:34 -0600 Subject: [PATCH 023/104] Ensure every chapter has a heading --- communicate.Rmd | 2 ++ databases.Rmd | 2 ++ model.Rmd | 5 ++++- program.Rmd | 2 ++ robust-code.Rmd | 2 +- science.Rmd | 2 ++ understand.Rmd | 2 ++ work.Rmd | 2 ++ 8 files changed, 17 insertions(+), 2 deletions(-) diff --git a/communicate.Rmd b/communicate.Rmd index 1e70684..3a6bb3e 100644 --- a/communicate.Rmd +++ b/communicate.Rmd @@ -3,4 +3,6 @@ layout: default title: Communicate your work --- +# Communicate your work + Reproducible, literate code is the data science equivalent of the Scientific Report (i.e, Intro, Methods and materials, Results, Discussion). diff --git a/databases.Rmd b/databases.Rmd index 8011808..19c1015 100644 --- a/databases.Rmd +++ b/databases.Rmd @@ -3,6 +3,8 @@ layout: default title: Databases --- +# Databases + ### Two-table verbs Each two-table verb has a straightforward SQL equivalent: diff --git a/model.Rmd b/model.Rmd index 32cf91c..e9763ef 100644 --- a/model.Rmd +++ b/model.Rmd @@ -3,6 +3,8 @@ layout: default title: Model --- +# Model + A model is a function that summarizes how the values of one variable vary in response to the values of other variables. Models play a large role in hypothesis testing and prediction, but for the moment you should think of models just like you think of statistics. A statistic summarizes a *distribution* in a way that is easy to understand; and a model summarizes *covariation* in a way that is easy to understand. In other words, a model is just another way to describe data. This chapter will explain how to build useful models with R. @@ -298,6 +300,7 @@ ns() # natural splines ``` ```{r} +library(splines) tidy(lm(income ~ ns(education, knots = c(10, 17)), data = heights)) tidy(lm(income ~ ns(education, df = 4), data = heights)) ``` @@ -314,7 +317,7 @@ ggplot(data = heights, mapping = aes(x= education, y = income)) + ```{r} gam(income ~ s(education), data = heights) -ggplot(data = heights, mapping = aes(x= education, y = income)) + +ggplot(data = heights, mapping = aes(x = education, y = income)) + geom_point() + geom_smooth(method = gam, formula = y ~ s(x)) ``` diff --git a/program.Rmd b/program.Rmd index 62563db..070ad92 100644 --- a/program.Rmd +++ b/program.Rmd @@ -3,4 +3,6 @@ layout: default title: Save time by programming --- +# Programming + Computer-human communication matters. diff --git a/robust-code.Rmd b/robust-code.Rmd index c50a71f..b9ee8c1 100644 --- a/robust-code.Rmd +++ b/robust-code.Rmd @@ -7,7 +7,7 @@ title: Robust code library(magrittr) ``` -## Robust code +# Robust code (This is an advanced topic. You shouldn't worry too much about it when you first start writing functions. Instead you should focus on getting a function that works right for the easiest 80% of the problem. Then in time, you'll learn how to get to 99% with minimal extra effort. The defaults in this book should steer you in the right direction: we avoid teaching you functions with major suprises.) diff --git a/science.Rmd b/science.Rmd index 816bdb8..e73002b 100644 --- a/science.Rmd +++ b/science.Rmd @@ -3,4 +3,6 @@ layout: default title: Do science with data --- +# Do science with data + The scientific method guides data science. Data science solves known problems with the scientific method. diff --git a/understand.Rmd b/understand.Rmd index d233976..0132b24 100644 --- a/understand.Rmd +++ b/understand.Rmd @@ -3,4 +3,6 @@ layout: default title: Understand your data --- +# Understand your data + Data poses a cognitive problem; Data comprehension is a skill. diff --git a/work.Rmd b/work.Rmd index 9fb6141..a9e4072 100644 --- a/work.Rmd +++ b/work.Rmd @@ -3,4 +3,6 @@ layout: default title: Work with your data --- +# Work with your data + With data, the relationships between values matter as much as the values themselves. Tidy data encodes those relationships. From 27e70f223480979e9d3fceb136a4a082d3b45fdd Mon Sep 17 00:00:00 2001 From: Radu Grosu Date: Fri, 12 Feb 2016 11:54:28 +0000 Subject: [PATCH 024/104] Update functions.Rmd typos --- functions.Rmd | 40 ++++++++++++++++++++-------------------- 1 file changed, 20 insertions(+), 20 deletions(-) diff --git a/functions.Rmd b/functions.Rmd index 2518321..3841594 100644 --- a/functions.Rmd +++ b/functions.Rmd @@ -17,9 +17,9 @@ diamonds <- ggplot2::diamonds Code is a tool of communication, not just to the computer, but to other people. This is important because every project you undertake is fundamentally collaborative. Even if you're not working with other people, you'll definitely be working with future-you. You want to write clear code so that future-you doesn't curse present-you when you look at a project again after several months have passed. -To me, improving your communication skills is a key part of mastering R as a programming language. Over time, you want your code to becomes more and more clear, and easier to write. In this chapter, you'll learn three important skills that help you to move in this direction: +To me, improving your communication skills is a key part of mastering R as a programming language. Over time, you want your code to become more and more clear, and easier to write. In this chapter, you'll learn three important skills that help you move in this direction: -1. We'll dive deep in to the __pipe__, `%>%`, talking more about how it works +1. We'll dive deep into the __pipe__, `%>%`, talking more about how it works and how it gives you a new tool for rewriting your code. You'll also learn about when not to use the pipe! @@ -34,7 +34,7 @@ To me, improving your communication skills is a key part of mastering R as a pro common patterns of for loops and put them in a function. We'll come back to that idea in XYZ. -Removing duplication is an important part of expressing yourself clearly because it lets the reader (i.e. future-you!) focus on what's different between operations rather than what's the same. The goal is not just to write better funtions or to do things that you couldn't do before, but to code with more "ease". As you internalise the ideas in this chapter, you should find it easier to re-tackle problems that you've solved in the past with much effort. +Removing duplication is an important part of expressing yourself clearly because it lets the reader (i.e. future-you!) focus on what's different between operations rather than what's the same. The goal is not just to write better functions or to do things that you couldn't do before, but to code with more "ease". As you internalise the ideas in this chapter, you should find it easier to re-tackle problems that you've solved in the past with much effort. Writing code is similar in many ways to writing prose. One parallel which I find particularly useful is that in both cases rewriting is key to clarity. The first expression of your ideas is unlikely to be particularly clear, and you may need to rewrite multiple times. After solving a data analysis challenge, it's often worth looking at your code and thinking about whether or not it's obvious what you've done. If you spend a little time rewriting your code while the ideas are fresh, you can save a lot of time later trying to recreate what your code did. But this doesn't mean you should rewrite every function: you need to balance what you need to achieve now with saving time in the long run. (But the more you rewrite your functions the more likely you'll first attempt will be clear.) @@ -51,7 +51,7 @@ To explore how you can write the same code in many different ways, let's use cod > Scooping up the field mice > And bopping them on the head -We'll start by defining an object to represent litte bunny Foo Foo: +We'll start by defining an object to represent little bunny Foo Foo: ```{r, eval = FALSE} foo_foo <- little_bunny() @@ -95,7 +95,7 @@ object_size(diamonds, diamonds2) * `diamonds2` takes up 3.89 MB, * `diamonds` and `diamonds2` together take up 3.89 MB! -How can that work? Well, `diamonds2` has 10 columns in common with `diamonds`: there's no need to duplicate all that data so both data frames share the vectors. R will only create a copy of a vector if you modify it. Modifying a single value will mean that the data frames can no longer share as much memory. The individual sizes will be unchange, but the collective size will increase: +How can that work? Well, `diamonds2` has 10 columns in common with `diamonds`: there's no need to duplicate all that data so both data frames share the vectors. R will only create a copy of a vector if you modify it. Modifying a single value will mean that the data frames can no longer share as much memory. The individual sizes will be unchanged, but the collective size will increase: ```{r} diamonds$carat[1] <- NA @@ -121,7 +121,7 @@ This is less typing (and less thinking), so you're less likely to make mistakes. 1. It will make debugging painful: if you make a mistake you'll need to start again from scratch. -1. The reptition of the object being transformed (we've written `foo_foo` six +1. The repetition of the object being transformed (we've written `foo_foo` six times!) obscures what's changing on each line. #### Function composition @@ -205,7 +205,7 @@ library(magrittr) cor(disp, mpg) ``` -* For assignment. magrittr provides the `%<>%` operator which allows you to +* For assignment magrittr provides the `%<>%` operator which allows you to replace code like: ```R @@ -219,7 +219,7 @@ library(magrittr) ``` I'm not a fan of this operator because I think assignment is such a - special operation that it should always be clear when it's occuring. + special operation that it should always be clear when it's occurring. In my opinion, a little bit of duplication (i.e. repeating the name of the object twice), is fine in return for making assignment more explicit. @@ -237,19 +237,19 @@ The pipe is a powerful tool, but it's not the only tool at your disposal, and it * You have multiple inputs or outputs. If there is not one primary object being transformed, write code the regular ways. -* You are start to think about a directed graph with a complex +* You are starting to think about a directed graph with a complex dependency structure. Pipes are fundamentally linear and expressing complex relationships with them typically does not yield clear code. ### Pipes in production -When you run a pipe interactively, it's easy to see if something goes wrong. When you start writing pipes that are used in production, i.e. they're run automatically and a human doesn't immediately look at the output it's a really good idea to include some assertions that verify the data looks like expect. One great way to do this is the ensurer package, writen by Stefan Milton Bache (the author of magrittr). +When you run a pipe interactively, it's easy to see if something goes wrong. When you start writing pipes that are used in production, i.e. they're run automatically and a human doesn't immediately look at the output it's a really good idea to include some assertions that verify the data looks like expected. One great way to do this is the ensurer package, written by Stefan Milton Bache (the author of magrittr). ## Functions -One of the best ways to grow in your capabilities as a user of R for data science is to write functions. Functions allow you to automate common tasks, instead of using copy-and-paste. Writing good functions is a lifetime journey: you won't learn everything but you'll hopefully get start walking in the right direction. +One of the best ways to grow in your capabilities as a user of R for data science is to write functions. Functions allow you to automate common tasks, instead of using copy-and-paste. Writing good functions is a lifetime journey: you won't learn everything but you'll hopefully get to start walking in the right direction. Whenever you've copied and pasted code more than twice, you need to take a look at it and see if you can extract out the common components and make a function. For example, take a look at this code. What does it do? @@ -344,7 +344,7 @@ foo <- function(x = 1, y = TRUE, z = 10:1) { } ``` -Default values can depend on other arguments but don't over use this technique as it's possible to create code that is very difficult to understand: +Default values can depend on other arguments but don't overuse this technique as it's possible to create code that is very difficult to understand: ```{r} bar <- function(x = y + 1, y = x + 1) { @@ -352,7 +352,7 @@ bar <- function(x = y + 1, y = x + 1) { } ``` -On other aspect of arguments you'll commonly see is `...`. This captures any other arguments not otherwise matched. It's useful because you can then send those `...` on to another argument. This is a useful catch all if your function primarily wraps another function. For example, you might have written your own wrapper designed to add linear model lines to a ggplot: +On other aspect of arguments you'll commonly see is `...`. This captures any other arguments not otherwise matched. It's useful because you can then send those `...` on to another argument. This is a useful catch-all if your function primarily wraps another function. For example, you might have written your own wrapper designed to add linear model lines to a ggplot: ```{r} geom_lm <- function(formula = y ~ x, colour = alpha("steelblue", 0.5), @@ -362,7 +362,7 @@ geom_lm <- function(formula = y ~ x, colour = alpha("steelblue", 0.5), } ``` -This allows you to use any other arguments of `geom_smooth()`, even thoses that aren't explicitly listed in your wrapper (and even arguments that don't exist yet in the version of ggplot2 that you're using). +This allows you to use any other arguments of `geom_smooth()`, even those that aren't explicitly listed in your wrapper (and even arguments that don't exist yet in the version of ggplot2 that you're using). Note that arguments in R are lazily evaluated: they're not computed until they're needed. That means if they're never used, they're never called: @@ -493,9 +493,9 @@ f(10) You should avoid functions that work like this because it makes it harder to predict what your function will return. -This behaviour seems like a recipe for bugs, but by and large it doesn't cause too many, especially as you become a more experienced R programmer. The advantage of this behaviour is from a language stand point it allows R to be very consistent. Every name is looked up using the same set of rules. For `f()` that includes the behaviour of two things that you might not expect: `{` and `+`. +This behaviour seems like a recipe for bugs, but by and large it doesn't cause too many, especially as you become a more experienced R programmer. The advantage of this behaviour is that from a language standpoint it allows R to be very consistent. Every name is looked up using the same set of rules. For `f()` that includes the behaviour of two things that you might not expect: `{` and `+`. -This consistent set of rules allows for a number of powerful tool that are unfortunately beyond the scope of this book, but you can read about in "Advanced R". +This consistent set of rules allows for a number of powerful tools that are unfortunately beyond the scope of this book, but you can read about in "Advanced R". #### Exercises @@ -577,9 +577,9 @@ mean_by <- function(data, group_var, mean_var, n = 10) { } ``` -Because this tells dplyr to group by `group_var` and compute the mean of `mean_var` neither of which exist in the data frame. A similar problem exists in ggplot2. +This fails because it tells dplyr to group by `group_var` and compute the mean of `mean_var` neither of which exist in the data frame. A similar problem exists in ggplot2. -I've only really recently understood this problem well, so the solutions are currently rather complicated and beyond the scope of this book. You can learn them online techniques with online resources: +I've only really recently understood this problem well, so the solutions are currently rather complicated and beyond the scope of this book. You can learn about these techniques online: * Programming with ggplot2 (an excerpt from the ggplot2 book): http://rpubs.com/hadley/97970 @@ -649,7 +649,7 @@ df$d <- rescale01(df$d) In this case the output is already present: we're modifying an existing object. -Need to think about a data frame as a list of column (we'll make this definition precise later on). The length of a data frame is the number of columns. To extract a single column, you use `[[`. +Think about a data frame as a list of columns (we'll make this definition precise later on). The length of a data frame is the number of columns. To extract a single column, you use `[[`. That makes our for loop quite simple: @@ -678,7 +678,7 @@ There are three basic ways to loop over a vector: but it's difficult to save the output efficiently. 1. Loop over the numeric indices: `for (i in seq_along(xs))`. Most common - form if you want to know the element (`xs[[i]]`) and it's position. + form if you want to know the element (`xs[[i]]`) and its position. 1. Loop over the names: `for (nm in names(xs))`. Gives you both the name and the position. This is useful if you want to use the name in a From 3d5fa7a8fd39dbae55230c92e9ada03cdf66d428 Mon Sep 17 00:00:00 2001 From: hadley Date: Fri, 12 Feb 2016 06:12:55 -0600 Subject: [PATCH 025/104] Ignore temporary files and use new_session. --- .gitignore | 2 ++ _bookdown.yml | 2 ++ 2 files changed, 4 insertions(+) diff --git a/.gitignore b/.gitignore index 8c962b9..1501c2e 100644 --- a/.gitignore +++ b/.gitignore @@ -12,3 +12,5 @@ _main.Rmd book_assets .bundle vendor +*.md +_main.rds diff --git a/_bookdown.yml b/_bookdown.yml index 4dc0c17..a1bb233 100644 --- a/_bookdown.yml +++ b/_bookdown.yml @@ -1,3 +1,5 @@ +new_session: yes + rmd_files: [ "understand.Rmd", "visualize.Rmd", From 616cad0f7aef170afa8368e07362f14da8e1e163 Mon Sep 17 00:00:00 2001 From: hadley Date: Fri, 12 Feb 2016 16:05:25 -0600 Subject: [PATCH 026/104] More about functions --- functions.Rmd | 93 ++++++++++++++++++++++++++++++++++--------------- robust-code.Rmd | 4 +-- 2 files changed, 66 insertions(+), 31 deletions(-) diff --git a/functions.Rmd b/functions.Rmd index 3841594..2fa9c4b 100644 --- a/functions.Rmd +++ b/functions.Rmd @@ -271,7 +271,7 @@ df$d <- (df$d - min(df$d, na.rm = TRUE)) / (max(df$d, na.rm = TRUE) - min(df$d, na.rm = TRUE)) ``` -You might be able to puzzle out that this rescales each column to 0--1. But did you spot the mistake? I made an error when updating the code for `df$b`, and I forgot to change an `a` to a `b`. Extracting repeated code out into a function is a good idea because it helps make your code more understandable (because you can name the operation), and it prevents you from making this sort of copy-and-paste error. +You might be able to puzzle out that this rescales each column to 0--1. But did you spot the mistake? I made an error when copying-and-pasting the code for `df$b`, and I forgot to change an `a` to a `b`. Extracting repeated code out into a function is a good idea because it helps make your code more understandable (because you can name the operation), and it prevents you from making this class of errors. To write a function you need to first analyse the operation. How many inputs does it have? @@ -306,7 +306,7 @@ rescale01(c(0, 5, 10)) Always make sure your code works on a simple test case before creating the function! -Note the process that I followed here: constructing the `function` is the last thing I did. It's much easier to start with code that works on a sample input and then turn it into a function rather than the other way around. You're more likely to get to your final destination if you take small steps and check your work after each step. +Note the process that I followed here: I constructed the `function` last. It's much easier to start with code that works on a sample input and then turn it into a function rather than the other way around. You're more likely to get to your final destination if you take small steps and check your work after each step. Now we can use that to simplify our original example: @@ -321,18 +321,43 @@ This makes it more clear what we're doing, and avoids one class of copy-and-past ### Practice -Practice turning the following code snippets into functions. Think about how you can re-write them to be as clear and expressive as possible. +1. Practice turning the following code snippets into functions. Think about + what each function does. What would you call it? How many arguments does it + need? Can you rewrite it to be more expressive or less duplicative? + + ```{r, eval = FALSE} + mean(is.na(x)) + + x / sum(x, na.rm = TRUE) + + sd(x, na.rm = TRUE) / mean(x, na.rm = TRUE) + + mean((x - mean(x))^3) / mean((x - mean(x))^2)^(3/2) + ``` + +1. Implement a `fizzbuzz` function. It take a single number as input. If + the number is divisible by three, return "fizz". If it's divisible by + five return "buzz". If it's divisible by three and five, return "fizzbuzz". + Otherwise, return the number. ### Function components There are three attributes that define what a function does: -1. The __arguments__ of a function are its inputs. +1. The __arguments__ of a function are its possible inputs. + Sometimes these are called _formal_ arguments to distinguish them from + the actual arguments that a function is called with. For example, the + formal argument of mean are `x`, `trim` and `na.rm`, but a given call + might only use some of these arguments. 1. The __body__ of a function is the code that it runs each time. + The last statement evaluated in the function body is what it returns. + The return value is not a property of the function because it changes + depending on the input values. 1. The function __environment__ controls how it looks up values from names - (i.e. how it goes from the name `x`, to its value, `10`). + (i.e. how it goes from the name `x`, to its value, `10`). The set of + rules that governs this behaviour is called scoping. #### Arguments @@ -344,15 +369,17 @@ foo <- function(x = 1, y = TRUE, z = 10:1) { } ``` -Default values can depend on other arguments but don't overuse this technique as it's possible to create code that is very difficult to understand: +Whenever you have a mix of arguments with and without defaults, those without defaults should come first. + +Default values can depend on other arguments but don't overuse this technique as it's possible to create code that is very difficult to understand. What does this function do? ```{r} -bar <- function(x = y + 1, y = x + 1) { +bar <- function(x = y + 1, y = x - 1) { x * y } ``` -On other aspect of arguments you'll commonly see is `...`. This captures any other arguments not otherwise matched. It's useful because you can then send those `...` on to another argument. This is a useful catch-all if your function primarily wraps another function. For example, you might have written your own wrapper designed to add linear model lines to a ggplot: +There's a special argument that's used quite commonly: `...`. This captures any other arguments not otherwise matched. It's useful because you can then send those `...` on to another argument. This is a useful catch-all if your function primarily wraps another function. For example, you might have written your own wrapper designed to add linear model lines to a ggplot: ```{r} geom_lm <- function(formula = y ~ x, colour = alpha("steelblue", 0.5), @@ -491,20 +518,34 @@ y <- 1000 f(10) ``` -You should avoid functions that work like this because it makes it harder to predict what your function will return. +This behaviour seems like a recipe for bugs, and indeed you should avoid creating functions like this deliberately, but by and large it doesn't cause too many problems (especially if you regularly restart R to get to a clean slate). The advantage of this behaviour is that from a language standpoint it allows R to be very consistent. Every name is looked up using the same set of rules. For `f()` that includes the behaviour of two things that you might not expect: `{` and `+`. -This behaviour seems like a recipe for bugs, but by and large it doesn't cause too many, especially as you become a more experienced R programmer. The advantage of this behaviour is that from a language standpoint it allows R to be very consistent. Every name is looked up using the same set of rules. For `f()` that includes the behaviour of two things that you might not expect: `{` and `+`. +This allows you to do devious things like: -This consistent set of rules allows for a number of powerful tools that are unfortunately beyond the scope of this book, but you can read about in "Advanced R". +```{r} +`+` <- function(x, y) { + if (runif(1) < 0.1) { + sum(x, y) + } else { + sum(x, y) * 1.1 + } +} +table(replicate(1000, 1 + 2)) +rm(`+`) +``` + +This is a common phenomenon in R. R gives you a lot of control. You can do many things that are not possible in other programming languages. You can things that 99% of the time extremely ill-advised (like overriding how addition works!), but this power and flexibility is what makes tools like ggplot2 and dplyr possible. Learning how to make good use of this flexibility is beyond the scope of this book, but you can read about in "Advanced R". #### Exercises +1. What happens if you call `bar()`? What does the error message mean? + 1. What happens if you try to override the method in `geom_lm()` created - above? Why? + above (e.g. `geom_lm(method = "glm")`? Why? ### Making functions with magrittr -Another way to write functions is using magrittr. You've already seen how to run a concrete magrittr pipeline: +Another way to write functions is using magrittr. You've already seen how to execute a pipeline on a specific dataset: ```{r} library(dplyr) @@ -514,7 +555,7 @@ mtcars %>% summarise(n = n()) ``` -You can easily turn that into a function by using `.` as the first object: +But you can also create a generic pipeline that you can apply to any object: ```{r} my_fun <- . %>% @@ -526,11 +567,11 @@ my_fun my_fun(mtcars) ``` -This is a great way to create a quick and dirty function if you've already made one pipe and now want to re-apply it in many places. +The key is to use `.` as the initial input in to the pipe. This is a great way to create a quick and dirty function if you've already made one pipe and now want to re-apply it in many places. ### Non-standard evaluation -One challenge with writing functions is that many of the functions you've used in this book use non-standard evaluation to minimise typing. This makes these functions great for interactive use, but it does make it more challenging to program with them, because you need to use more advanced techniques. For example, imagine you find yourself doing this pattern very commonly: +One challenge with writing functions is that many of the functions you've used in this book use non-standard evaluation to minimise typing. This makes these functions great for interactive use, but it does make it more challenging to program with them, because you need to use more advanced techniques. For example, imagine you'd written the following duplicated code across a handful of data analysis projects: ```{r} mtcars %>% @@ -577,19 +618,7 @@ mean_by <- function(data, group_var, mean_var, n = 10) { } ``` -This fails because it tells dplyr to group by `group_var` and compute the mean of `mean_var` neither of which exist in the data frame. A similar problem exists in ggplot2. - -I've only really recently understood this problem well, so the solutions are currently rather complicated and beyond the scope of this book. You can learn about these techniques online: - -* Programming with ggplot2 (an excerpt from the ggplot2 book): - http://rpubs.com/hadley/97970 - -* Programming with dplyr: still hasn't been written. - -* Understanding non-standard evaluation in general: - . - -This is definitely an advanced topic, and I haven't done a good job of either explaining well or providing tools to make it easy, or being consistent across packages. So don't worry if you find it hard! +This fails because it tells dplyr to group by `group_var` and compute the mean of `mean_var` neither of which exist in the data frame. Writing reusable functions for ggplot2 poses a similar problem because `aes(group_var, mean_var)` would look for variables called `group_var` and `mean_var`. It's really only been in the last couple of months that I fully understood this problem, so there aren't currently any great (or general) solutions. However, now that I've understood the problem I think there will be some systematic solutions in the near future. ### Exercises @@ -695,6 +724,12 @@ for (i in seq_along(x)) { ### Exercises +1. Convert the song "99 bottles of beer on the wall" to a function. Generalise + to any number of any vessel containing any liquid on any surface. + +1. Convert the nursey rhyme "ten in the bed" to a function. Generalise it + to any number of people in any sleeping structure. + 1. It's common to see for loops that don't preallocate the output and instead increase the length of a vector at each step: diff --git a/robust-code.Rmd b/robust-code.Rmd index b9ee8c1..928eafd 100644 --- a/robust-code.Rmd +++ b/robust-code.Rmd @@ -189,11 +189,11 @@ big_x <- function(df, threshold) { } ``` -Because dplyr currently has no way to force a name to be interpreted as either a local or parent variable, as I've only just realised that's really you should avoid NSE. In a future version you should be able to do: +Because dplyr currently has no way to force a name to be interpreted as either a local or parent variable, as I've only just realised that's really you should avoid NSE. In a future version you should be able to do: ```{r} big_x <- function(df, threshold) { - dplyr::filter(df, .this$x > .parent$threshold) + dplyr::filter(df, local(x) > parent(threshold)) } ``` From c87c50301b05d2d1c9e388055ce35a0f8b194b22 Mon Sep 17 00:00:00 2001 From: hadley Date: Fri, 12 Feb 2016 16:07:40 -0600 Subject: [PATCH 027/104] More reliable way of getting number of stringi functions --- strings.Rmd | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/strings.Rmd b/strings.Rmd index 402be2c..23a293f 100644 --- a/strings.Rmd +++ b/strings.Rmd @@ -818,7 +818,7 @@ There are a few other functions in base R that accept regular expressions: ### The stringi package -stringr is built on top of the __stringi__ package. stringr is useful when you're learning because it exposes a minimal set of functions, that have been carefully picked to handle the most common string manipulation functions. stringi on the other hand is designed to be comprehensive. It contains almost every function you might ever need. stringi has `r length(ls("package:stringi"))` functions to stringr's `r length(ls("package:stringr"))`. +stringr is built on top of the __stringi__ package. stringr is useful when you're learning because it exposes a minimal set of functions, that have been carefully picked to handle the most common string manipulation functions. stringi on the other hand is designed to be comprehensive. It contains almost every function you might ever need. stringi has `r length(ls(getNamespace("stringi")))` functions to stringr's `r length(ls("package:stringr"))`. So if you find yourself struggling to do something that doesn't seem natural in stringr, it's worth taking a look at stringi. The use of the two packages is very similar because stringr was designed to mimic stringi's interface. The main difference is the prefix: `str_` vs `stri_`. From e2965d5685229ecaf303073645dd364c50af23d9 Mon Sep 17 00:00:00 2001 From: Radu Grosu Date: Sat, 13 Feb 2016 14:01:43 +0000 Subject: [PATCH 028/104] Update lists.Rmd typos --- lists.Rmd | 46 +++++++++++++++++++++++----------------------- 1 file changed, 23 insertions(+), 23 deletions(-) diff --git a/lists.Rmd b/lists.Rmd index d1fadfb..a85ce52 100644 --- a/lists.Rmd +++ b/lists.Rmd @@ -10,7 +10,7 @@ library(purrr) source("common.R") ``` -In this chapter, you'll learn how to handle lists, the data structure R uses for complex, hierarchical objects. You've already familiar with vectors, R's data structure for 1d objects. Lists extend these ideas to model objects that are like trees. You can create a hierarchical structure with a list because unlike vectors, a list can contain other lists. +In this chapter, you'll learn how to handle lists, the data structure R uses for complex, hierarchical objects. You're already familiar with vectors, R's data structure for 1d objects. Lists extend these ideas to model objects that are like trees. You can create a hierarchical structure with a list because unlike vectors, a list can contain other lists. If you've worked with list-like objects before, you're probably familiar with the for loop. I'll talk a little bit about for loops here, but the focus will be functions from the __purrr__ package. purrr makes it easier to work with lists by eliminating common for loop boilerplate so you can focus on the specifics. The apply family of functions in base R (`apply()`, `lapply()`, `tapply()`, etc) solve a similar problem, but purrr is more consistent and easier to learn. @@ -23,11 +23,11 @@ The goal of using purrr functions instead of for loops is to allow you break com 1. If you're solving a complex problem, how can you break it down into bite sized pieces that allow you to advance one small step towards a solution? With purrr, you get lots of small pieces that you can - combose together with the pipe. + compose together with the pipe. This structure makes it easier to solve new problems. It also makes it easier to understand your solutions to old problems when you re-read your old code. -In later chapters you'll learn how to apply these ideas when modelling. You can often use multiple simple models to help understand a complex dataset, or you might have multiple models because you're bootstrapping or cross-validating. The techniques you learn in this chapter will be invaluable. +In later chapters you'll learn how to apply these ideas when modelling. You can often use multiple simple models to help understand a complex dataset, or you might have multiple models because you're bootstrapping or cross-validating. The techniques you'll learn in this chapter will be invaluable. - - - - - - - diff --git a/_layouts/post.html b/_layouts/post.html deleted file mode 100644 index 04e3586..0000000 --- a/_layouts/post.html +++ /dev/null @@ -1,9 +0,0 @@ ---- -layout: default ---- -

{{ page.title }}

-

{{ page.date | date_to_string }}

- -
-{{ content }} -
diff --git a/_plugins/knit.r b/_plugins/knit.r deleted file mode 100755 index 0d0f1ce..0000000 --- a/_plugins/knit.r +++ /dev/null @@ -1,24 +0,0 @@ -#!/usr/bin/Rscript -library(rmarkdown) -library(bookdown) -library(methods) - -args <- commandArgs(trailingOnly = TRUE) -path <- args[1] - -if (!file.exists(path)) { - stop("Can't find path ", path, call. = FALSE) -} - -if (file.access(path, 4) != 0) { - stop("Can't read path ", path, call. = FALSE) -} - -html_path <- render(path, html_chapter(raw = TRUE, toc = "toc.rds"), - quiet = TRUE) - -read_file <- function(path) { - size <- file.info(path)$size - readChar(path, size, useBytes = TRUE) -} -cat(read_file(html_path)) diff --git a/_plugins/rmarkdown.rb b/_plugins/rmarkdown.rb deleted file mode 100644 index 9bbb72f..0000000 --- a/_plugins/rmarkdown.rb +++ /dev/null @@ -1,33 +0,0 @@ -require 'tempfile' - -module Jekyll - class RMarkdownConverter < Converter - safe :false - priority :high - - def matches(ext) - ext =~ /^\.(rmd|rmarkdown)$/i - end - - def output_ext(ext) - ".html" - end - - def convert(content) - f = File.new("temp.Rmd", "w") - f.write(content) - f.write("\n") - f.flush - - # http://rubyquicktips.com/post/5862861056/execute-shell-commands - content = `_plugins/knit.r temp.Rmd` - - if $?.exitstatus != 0 - raise "Knitting failed" - end - - content - # File.unlink f.path - end - end -end diff --git a/functions.Rmd b/functions.Rmd index 840b8a3..021490d 100644 --- a/functions.Rmd +++ b/functions.Rmd @@ -8,8 +8,7 @@ title: Expressing yourself in code ```{r, include = FALSE} source("common.R") knitr::opts_chunk$set( - cache = TRUE, - fig.path = "figures/functions/" + cache = TRUE ) library(dplyr) diamonds <- ggplot2::diamonds diff --git a/index.rmd b/index.rmd index c7e31da..02d6d2d 100644 --- a/index.rmd +++ b/index.rmd @@ -6,18 +6,14 @@ knit: "bookdown::render_book" output: bookdown::html_chapters: lib_dir: "book_assets" + toc_depth: 1 + html_names: "chapter" --- -# R for Data Science +# Welcome This is the book site for __"R for data science"__. This book will teach you how to do data science with R: You'll learn how to get your data into R, get it into the most useful structure, transform it, visualise it and model it. In this book, you will find a practicum of skills for data science. Just as a chemist learns how to clean test tubes and stock a lab, you'll learn how to clean data and draw plots---and many other things besides. These are the skills that allow data science to happen, and here you will find the best practices for doing each of these things with R. You'll learn how to use the grammar of graphics, literate programming, and reproducible research to save time. You'll also learn how to manage cognitive resources to facilitate discoveries when wrangling, visualizing, and exploring data. (__R for Data Science__ was formally called __Data Science with R__ in __Hands-On Programming with R__) To be published by O'Reilly in July 2016. Cover image - -## Table of contents {#toc} - -
    - {% include package-nav.html %} -
diff --git a/r4ds.Rproj b/r4ds.Rproj index f6cd4b6..68b32c5 100644 --- a/r4ds.Rproj +++ b/r4ds.Rproj @@ -15,6 +15,5 @@ LaTeX: XeLaTeX AutoAppendNewline: Yes StripTrailingWhitespace: Yes -BuildType: Package -PackageUseDevtools: Yes -PackageInstallArgs: --no-multiarch --with-keep.source +BuildType: Custom +CustomScriptPath: _build.sh diff --git a/relational-data.Rmd b/relational-data.Rmd index 0e918ed..31c1cf2 100644 --- a/relational-data.Rmd +++ b/relational-data.Rmd @@ -11,7 +11,7 @@ library(nycflights13) library(ggplot2) source("common.R") options(dplyr.print_min = 6, dplyr.print_max = 6) -knitr::opts_chunk$set(fig.path = "figures/", cache = TRUE) +knitr::opts_chunk$set(cache = TRUE) ``` It's rare that a data analysis involves only a single table of data. Typically you have many tables of data, and you must combine them to answer the questions that you're interested in. Collectively, multiple tables of data are called __relational data__ because it is the relations, not just the individual datasets, that are particularly important. diff --git a/toc.rds b/toc.rds deleted file mode 100644 index 514cfd29b1f35ef6aeb18feda8e09fa4994baaf2..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 154 zcmV;L0A>FliwFP!000001B>8dU|?WkU}j=sU}6R_g@FVo5DNe?BLfSV%^9DYn3<;+ zl$%1iL}p$}YK2}ArbJF=aY->Y9k?WTONtWniqrCoaw(N$VM3B*%}dNpEr#mgggFAP z116A>nOc-sl$=os6<{e(%*lqbnM?AMiBX4PDtlIbW}a>mOf4svTT)q&3gr9)0P_3C Ie5(Nf0H1?A4*&oF diff --git a/toc.yaml b/toc.yaml deleted file mode 100644 index dd2ad70..0000000 --- a/toc.yaml +++ /dev/null @@ -1,29 +0,0 @@ -_main.Rmd: -- transform -- hierarchy -- walk -contribute.rmd: [] -data-structures.Rmd: [] -databases.Rmd: [] -datetimes.Rmd: [] -eda.Rmd: [] -functions.Rmd: [] -import.Rmd: [] -index.rmd: toc -intro.Rmd: [] -lists.Rmd: -- hierarchy -- walk -model-assess.Rmd: [] -model-vis.Rmd: [] -model.Rmd: [] -rmarkdown.Rmd: [] -shiny.Rmd: [] -strings.Rmd: [] -temp.Rmd: [] -tidy.Rmd: [] -transform.Rmd: -- transform -- join-by -- join-type -visualize.Rmd: [] diff --git a/transform.Rmd b/transform.Rmd index 4aed1b8..65ad699 100644 --- a/transform.Rmd +++ b/transform.Rmd @@ -12,7 +12,6 @@ library(ggplot2) source("common.R") options(dplyr.print_min = 6, dplyr.print_max = 6) knitr::opts_chunk$set( - fig.path = "figures/transform/", cache = TRUE ) ``` diff --git a/variation.Rmd b/variation.Rmd index 449acff..f1bd0d0 100644 --- a/variation.Rmd +++ b/variation.Rmd @@ -8,8 +8,7 @@ title: Variation ```{r, include = FALSE} library(ggplot2) knitr::opts_chunk$set( - cache = TRUE, - fig.path = "figures/variation/" + cache = TRUE ) ``` diff --git a/visualize.Rmd b/visualize.Rmd index 959b2ba..1c8181f 100644 --- a/visualize.Rmd +++ b/visualize.Rmd @@ -7,8 +7,7 @@ title: Visualize ```{r setup-visualise, include = FALSE} knitr::opts_chunk$set( - cache = TRUE, - fig.path = "figures/visualize/" + cache = TRUE ) ``` diff --git a/www/.gitignore b/www/.gitignore deleted file mode 100644 index b1f476c..0000000 --- a/www/.gitignore +++ /dev/null @@ -1,5 +0,0 @@ -bootstrap-2.3.2 -bootstrap-3.3.5 -htmlwidgets-0.5.2 -jquery-1.11.3 -navigation-1.0 diff --git a/www/bootstrap-3.3.1/css/bootstrap-theme.css b/www/bootstrap-3.3.1/css/bootstrap-theme.css deleted file mode 100644 index c4cadf1..0000000 --- a/www/bootstrap-3.3.1/css/bootstrap-theme.css +++ /dev/null @@ -1,470 +0,0 @@ -/*! - * Bootstrap v3.3.1 (http://getbootstrap.com) - * Copyright 2011-2014 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE) - */ - -.btn-default, -.btn-primary, -.btn-success, -.btn-info, -.btn-warning, -.btn-danger { - text-shadow: 0 -1px 0 rgba(0, 0, 0, .2); - -webkit-box-shadow: inset 0 1px 0 rgba(255, 255, 255, .15), 0 1px 1px rgba(0, 0, 0, .075); - box-shadow: inset 0 1px 0 rgba(255, 255, 255, .15), 0 1px 1px rgba(0, 0, 0, .075); -} -.btn-default:active, -.btn-primary:active, -.btn-success:active, -.btn-info:active, -.btn-warning:active, -.btn-danger:active, -.btn-default.active, -.btn-primary.active, -.btn-success.active, -.btn-info.active, -.btn-warning.active, -.btn-danger.active { - -webkit-box-shadow: inset 0 3px 5px rgba(0, 0, 0, .125); - box-shadow: inset 0 3px 5px rgba(0, 0, 0, .125); -} -.btn-default .badge, -.btn-primary .badge, -.btn-success .badge, -.btn-info .badge, -.btn-warning .badge, -.btn-danger .badge { - text-shadow: none; -} -.btn:active, -.btn.active { - background-image: none; -} -.btn-default { - text-shadow: 0 1px 0 #fff; - background-image: -webkit-linear-gradient(top, #fff 0%, #e0e0e0 100%); - background-image: -o-linear-gradient(top, #fff 0%, #e0e0e0 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#fff), to(#e0e0e0)); - background-image: linear-gradient(to bottom, #fff 0%, #e0e0e0 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffffffff', endColorstr='#ffe0e0e0', GradientType=0); - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - background-repeat: repeat-x; - border-color: #dbdbdb; - border-color: #ccc; -} -.btn-default:hover, -.btn-default:focus { - background-color: #e0e0e0; - background-position: 0 -15px; -} -.btn-default:active, -.btn-default.active { - background-color: #e0e0e0; - border-color: #dbdbdb; -} -.btn-default:disabled, -.btn-default[disabled] { - background-color: #e0e0e0; - background-image: none; -} -.btn-primary { - background-image: -webkit-linear-gradient(top, #337ab7 0%, #265a88 100%); - background-image: -o-linear-gradient(top, #337ab7 0%, #265a88 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#337ab7), to(#265a88)); - background-image: linear-gradient(to bottom, #337ab7 0%, #265a88 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff265a88', GradientType=0); - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - background-repeat: repeat-x; - border-color: #245580; -} -.btn-primary:hover, -.btn-primary:focus { - background-color: #265a88; - background-position: 0 -15px; -} -.btn-primary:active, -.btn-primary.active { - background-color: #265a88; - border-color: #245580; -} -.btn-primary:disabled, -.btn-primary[disabled] { - background-color: #265a88; - background-image: none; -} -.btn-success { - background-image: -webkit-linear-gradient(top, #5cb85c 0%, #419641 100%); - background-image: -o-linear-gradient(top, #5cb85c 0%, #419641 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#5cb85c), to(#419641)); - background-image: linear-gradient(to bottom, #5cb85c 0%, #419641 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5cb85c', endColorstr='#ff419641', GradientType=0); - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - background-repeat: repeat-x; - border-color: #3e8f3e; -} -.btn-success:hover, -.btn-success:focus { - background-color: #419641; - background-position: 0 -15px; -} -.btn-success:active, -.btn-success.active { - background-color: #419641; - border-color: #3e8f3e; -} -.btn-success:disabled, -.btn-success[disabled] { - background-color: #419641; - background-image: none; -} -.btn-info { - background-image: -webkit-linear-gradient(top, #5bc0de 0%, #2aabd2 100%); - background-image: -o-linear-gradient(top, #5bc0de 0%, #2aabd2 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#5bc0de), to(#2aabd2)); - background-image: linear-gradient(to bottom, #5bc0de 0%, #2aabd2 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5bc0de', endColorstr='#ff2aabd2', GradientType=0); - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - background-repeat: repeat-x; - border-color: #28a4c9; -} -.btn-info:hover, -.btn-info:focus { - background-color: #2aabd2; - background-position: 0 -15px; -} -.btn-info:active, -.btn-info.active { - background-color: #2aabd2; - border-color: #28a4c9; -} -.btn-info:disabled, -.btn-info[disabled] { - background-color: #2aabd2; - background-image: none; -} -.btn-warning { - background-image: -webkit-linear-gradient(top, #f0ad4e 0%, #eb9316 100%); - background-image: -o-linear-gradient(top, #f0ad4e 0%, #eb9316 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#f0ad4e), to(#eb9316)); - background-image: linear-gradient(to bottom, #f0ad4e 0%, #eb9316 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff0ad4e', endColorstr='#ffeb9316', GradientType=0); - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - background-repeat: repeat-x; - border-color: #e38d13; -} -.btn-warning:hover, -.btn-warning:focus { - background-color: #eb9316; - background-position: 0 -15px; -} -.btn-warning:active, -.btn-warning.active { - background-color: #eb9316; - border-color: #e38d13; -} -.btn-warning:disabled, -.btn-warning[disabled] { - background-color: #eb9316; - background-image: none; -} -.btn-danger { - background-image: -webkit-linear-gradient(top, #d9534f 0%, #c12e2a 100%); - background-image: -o-linear-gradient(top, #d9534f 0%, #c12e2a 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#d9534f), to(#c12e2a)); - background-image: linear-gradient(to bottom, #d9534f 0%, #c12e2a 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffd9534f', endColorstr='#ffc12e2a', GradientType=0); - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - background-repeat: repeat-x; - border-color: #b92c28; -} -.btn-danger:hover, -.btn-danger:focus { - background-color: #c12e2a; - background-position: 0 -15px; -} -.btn-danger:active, -.btn-danger.active { - background-color: #c12e2a; - border-color: #b92c28; -} -.btn-danger:disabled, -.btn-danger[disabled] { - background-color: #c12e2a; - background-image: none; -} -.thumbnail, -.img-thumbnail { - -webkit-box-shadow: 0 1px 2px rgba(0, 0, 0, .075); - box-shadow: 0 1px 2px rgba(0, 0, 0, .075); -} -.dropdown-menu > li > a:hover, -.dropdown-menu > li > a:focus { - background-color: #e8e8e8; - background-image: -webkit-linear-gradient(top, #f5f5f5 0%, #e8e8e8 100%); - background-image: -o-linear-gradient(top, #f5f5f5 0%, #e8e8e8 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#f5f5f5), to(#e8e8e8)); - background-image: linear-gradient(to bottom, #f5f5f5 0%, #e8e8e8 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff5f5f5', endColorstr='#ffe8e8e8', GradientType=0); - background-repeat: repeat-x; -} -.dropdown-menu > .active > a, -.dropdown-menu > .active > a:hover, -.dropdown-menu > .active > a:focus { - background-color: #2e6da4; - background-image: -webkit-linear-gradient(top, #337ab7 0%, #2e6da4 100%); - background-image: -o-linear-gradient(top, #337ab7 0%, #2e6da4 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#337ab7), to(#2e6da4)); - background-image: linear-gradient(to bottom, #337ab7 0%, #2e6da4 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff2e6da4', GradientType=0); - background-repeat: repeat-x; -} -.navbar-default { - background-image: -webkit-linear-gradient(top, #fff 0%, #f8f8f8 100%); - background-image: -o-linear-gradient(top, #fff 0%, #f8f8f8 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#fff), to(#f8f8f8)); - background-image: linear-gradient(to bottom, #fff 0%, #f8f8f8 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffffffff', endColorstr='#fff8f8f8', GradientType=0); - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - background-repeat: repeat-x; - border-radius: 4px; - -webkit-box-shadow: inset 0 1px 0 rgba(255, 255, 255, .15), 0 1px 5px rgba(0, 0, 0, .075); - box-shadow: inset 0 1px 0 rgba(255, 255, 255, .15), 0 1px 5px rgba(0, 0, 0, .075); -} -.navbar-default .navbar-nav > .open > a, -.navbar-default .navbar-nav > .active > a { - background-image: -webkit-linear-gradient(top, #dbdbdb 0%, #e2e2e2 100%); - background-image: -o-linear-gradient(top, #dbdbdb 0%, #e2e2e2 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#dbdbdb), to(#e2e2e2)); - background-image: linear-gradient(to bottom, #dbdbdb 0%, #e2e2e2 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffdbdbdb', endColorstr='#ffe2e2e2', GradientType=0); - background-repeat: repeat-x; - -webkit-box-shadow: inset 0 3px 9px rgba(0, 0, 0, .075); - box-shadow: inset 0 3px 9px rgba(0, 0, 0, .075); -} -.navbar-brand, -.navbar-nav > li > a { - text-shadow: 0 1px 0 rgba(255, 255, 255, .25); -} -.navbar-inverse { - background-image: -webkit-linear-gradient(top, #3c3c3c 0%, #222 100%); - background-image: -o-linear-gradient(top, #3c3c3c 0%, #222 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#3c3c3c), to(#222)); - background-image: linear-gradient(to bottom, #3c3c3c 0%, #222 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff3c3c3c', endColorstr='#ff222222', GradientType=0); - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - background-repeat: repeat-x; -} -.navbar-inverse .navbar-nav > .open > a, -.navbar-inverse .navbar-nav > .active > a { - background-image: -webkit-linear-gradient(top, #080808 0%, #0f0f0f 100%); - background-image: -o-linear-gradient(top, #080808 0%, #0f0f0f 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#080808), to(#0f0f0f)); - background-image: linear-gradient(to bottom, #080808 0%, #0f0f0f 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff080808', endColorstr='#ff0f0f0f', GradientType=0); - background-repeat: repeat-x; - -webkit-box-shadow: inset 0 3px 9px rgba(0, 0, 0, .25); - box-shadow: inset 0 3px 9px rgba(0, 0, 0, .25); -} -.navbar-inverse .navbar-brand, -.navbar-inverse .navbar-nav > li > a { - text-shadow: 0 -1px 0 rgba(0, 0, 0, .25); -} -.navbar-static-top, -.navbar-fixed-top, -.navbar-fixed-bottom { - border-radius: 0; -} -@media (max-width: 767px) { - .navbar .navbar-nav .open .dropdown-menu > .active > a, - .navbar .navbar-nav .open .dropdown-menu > .active > a:hover, - .navbar .navbar-nav .open .dropdown-menu > .active > a:focus { - color: #fff; - background-image: -webkit-linear-gradient(top, #337ab7 0%, #2e6da4 100%); - background-image: -o-linear-gradient(top, #337ab7 0%, #2e6da4 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#337ab7), to(#2e6da4)); - background-image: linear-gradient(to bottom, #337ab7 0%, #2e6da4 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff2e6da4', GradientType=0); - background-repeat: repeat-x; - } -} -.alert { - text-shadow: 0 1px 0 rgba(255, 255, 255, .2); - -webkit-box-shadow: inset 0 1px 0 rgba(255, 255, 255, .25), 0 1px 2px rgba(0, 0, 0, .05); - box-shadow: inset 0 1px 0 rgba(255, 255, 255, .25), 0 1px 2px rgba(0, 0, 0, .05); -} -.alert-success { - background-image: -webkit-linear-gradient(top, #dff0d8 0%, #c8e5bc 100%); - background-image: -o-linear-gradient(top, #dff0d8 0%, #c8e5bc 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#dff0d8), to(#c8e5bc)); - background-image: linear-gradient(to bottom, #dff0d8 0%, #c8e5bc 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffdff0d8', endColorstr='#ffc8e5bc', GradientType=0); - background-repeat: repeat-x; - border-color: #b2dba1; -} -.alert-info { - background-image: -webkit-linear-gradient(top, #d9edf7 0%, #b9def0 100%); - background-image: -o-linear-gradient(top, #d9edf7 0%, #b9def0 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#d9edf7), to(#b9def0)); - background-image: linear-gradient(to bottom, #d9edf7 0%, #b9def0 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffd9edf7', endColorstr='#ffb9def0', GradientType=0); - background-repeat: repeat-x; - border-color: #9acfea; -} -.alert-warning { - background-image: -webkit-linear-gradient(top, #fcf8e3 0%, #f8efc0 100%); - background-image: -o-linear-gradient(top, #fcf8e3 0%, #f8efc0 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#fcf8e3), to(#f8efc0)); - background-image: linear-gradient(to bottom, #fcf8e3 0%, #f8efc0 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#fffcf8e3', endColorstr='#fff8efc0', GradientType=0); - background-repeat: repeat-x; - border-color: #f5e79e; -} -.alert-danger { - background-image: -webkit-linear-gradient(top, #f2dede 0%, #e7c3c3 100%); - background-image: -o-linear-gradient(top, #f2dede 0%, #e7c3c3 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#f2dede), to(#e7c3c3)); - background-image: linear-gradient(to bottom, #f2dede 0%, #e7c3c3 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff2dede', endColorstr='#ffe7c3c3', GradientType=0); - background-repeat: repeat-x; - border-color: #dca7a7; -} -.progress { - background-image: -webkit-linear-gradient(top, #ebebeb 0%, #f5f5f5 100%); - background-image: -o-linear-gradient(top, #ebebeb 0%, #f5f5f5 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#ebebeb), to(#f5f5f5)); - background-image: linear-gradient(to bottom, #ebebeb 0%, #f5f5f5 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffebebeb', endColorstr='#fff5f5f5', GradientType=0); - background-repeat: repeat-x; -} -.progress-bar { - background-image: -webkit-linear-gradient(top, #337ab7 0%, #286090 100%); - background-image: -o-linear-gradient(top, #337ab7 0%, #286090 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#337ab7), to(#286090)); - background-image: linear-gradient(to bottom, #337ab7 0%, #286090 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff286090', GradientType=0); - background-repeat: repeat-x; -} -.progress-bar-success { - background-image: -webkit-linear-gradient(top, #5cb85c 0%, #449d44 100%); - background-image: -o-linear-gradient(top, #5cb85c 0%, #449d44 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#5cb85c), to(#449d44)); - background-image: linear-gradient(to bottom, #5cb85c 0%, #449d44 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5cb85c', endColorstr='#ff449d44', GradientType=0); - background-repeat: repeat-x; -} -.progress-bar-info { - background-image: -webkit-linear-gradient(top, #5bc0de 0%, #31b0d5 100%); - background-image: -o-linear-gradient(top, #5bc0de 0%, #31b0d5 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#5bc0de), to(#31b0d5)); - background-image: linear-gradient(to bottom, #5bc0de 0%, #31b0d5 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5bc0de', endColorstr='#ff31b0d5', GradientType=0); - background-repeat: repeat-x; -} -.progress-bar-warning { - background-image: -webkit-linear-gradient(top, #f0ad4e 0%, #ec971f 100%); - background-image: -o-linear-gradient(top, #f0ad4e 0%, #ec971f 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#f0ad4e), to(#ec971f)); - background-image: linear-gradient(to bottom, #f0ad4e 0%, #ec971f 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff0ad4e', endColorstr='#ffec971f', GradientType=0); - background-repeat: repeat-x; -} -.progress-bar-danger { - background-image: -webkit-linear-gradient(top, #d9534f 0%, #c9302c 100%); - background-image: -o-linear-gradient(top, #d9534f 0%, #c9302c 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#d9534f), to(#c9302c)); - background-image: linear-gradient(to bottom, #d9534f 0%, #c9302c 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffd9534f', endColorstr='#ffc9302c', GradientType=0); - background-repeat: repeat-x; -} -.progress-bar-striped { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); -} -.list-group { - border-radius: 4px; - -webkit-box-shadow: 0 1px 2px rgba(0, 0, 0, .075); - box-shadow: 0 1px 2px rgba(0, 0, 0, .075); -} -.list-group-item.active, -.list-group-item.active:hover, -.list-group-item.active:focus { - text-shadow: 0 -1px 0 #286090; - background-image: -webkit-linear-gradient(top, #337ab7 0%, #2b669a 100%); - background-image: -o-linear-gradient(top, #337ab7 0%, #2b669a 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#337ab7), to(#2b669a)); - background-image: linear-gradient(to bottom, #337ab7 0%, #2b669a 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff2b669a', GradientType=0); - background-repeat: repeat-x; - border-color: #2b669a; -} -.list-group-item.active .badge, -.list-group-item.active:hover .badge, -.list-group-item.active:focus .badge { - text-shadow: none; -} -.panel { - -webkit-box-shadow: 0 1px 2px rgba(0, 0, 0, .05); - box-shadow: 0 1px 2px rgba(0, 0, 0, .05); -} -.panel-default > .panel-heading { - background-image: -webkit-linear-gradient(top, #f5f5f5 0%, #e8e8e8 100%); - background-image: -o-linear-gradient(top, #f5f5f5 0%, #e8e8e8 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#f5f5f5), to(#e8e8e8)); - background-image: linear-gradient(to bottom, #f5f5f5 0%, #e8e8e8 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff5f5f5', endColorstr='#ffe8e8e8', GradientType=0); - background-repeat: repeat-x; -} -.panel-primary > .panel-heading { - background-image: -webkit-linear-gradient(top, #337ab7 0%, #2e6da4 100%); - background-image: -o-linear-gradient(top, #337ab7 0%, #2e6da4 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#337ab7), to(#2e6da4)); - background-image: linear-gradient(to bottom, #337ab7 0%, #2e6da4 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff2e6da4', GradientType=0); - background-repeat: repeat-x; -} -.panel-success > .panel-heading { - background-image: -webkit-linear-gradient(top, #dff0d8 0%, #d0e9c6 100%); - background-image: -o-linear-gradient(top, #dff0d8 0%, #d0e9c6 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#dff0d8), to(#d0e9c6)); - background-image: linear-gradient(to bottom, #dff0d8 0%, #d0e9c6 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffdff0d8', endColorstr='#ffd0e9c6', GradientType=0); - background-repeat: repeat-x; -} -.panel-info > .panel-heading { - background-image: -webkit-linear-gradient(top, #d9edf7 0%, #c4e3f3 100%); - background-image: -o-linear-gradient(top, #d9edf7 0%, #c4e3f3 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#d9edf7), to(#c4e3f3)); - background-image: linear-gradient(to bottom, #d9edf7 0%, #c4e3f3 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffd9edf7', endColorstr='#ffc4e3f3', GradientType=0); - background-repeat: repeat-x; -} -.panel-warning > .panel-heading { - background-image: -webkit-linear-gradient(top, #fcf8e3 0%, #faf2cc 100%); - background-image: -o-linear-gradient(top, #fcf8e3 0%, #faf2cc 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#fcf8e3), to(#faf2cc)); - background-image: linear-gradient(to bottom, #fcf8e3 0%, #faf2cc 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#fffcf8e3', endColorstr='#fffaf2cc', GradientType=0); - background-repeat: repeat-x; -} -.panel-danger > .panel-heading { - background-image: -webkit-linear-gradient(top, #f2dede 0%, #ebcccc 100%); - background-image: -o-linear-gradient(top, #f2dede 0%, #ebcccc 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#f2dede), to(#ebcccc)); - background-image: linear-gradient(to bottom, #f2dede 0%, #ebcccc 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff2dede', endColorstr='#ffebcccc', GradientType=0); - background-repeat: repeat-x; -} -.well { - background-image: -webkit-linear-gradient(top, #e8e8e8 0%, #f5f5f5 100%); - background-image: -o-linear-gradient(top, #e8e8e8 0%, #f5f5f5 100%); - background-image: -webkit-gradient(linear, left top, left bottom, from(#e8e8e8), to(#f5f5f5)); - background-image: linear-gradient(to bottom, #e8e8e8 0%, #f5f5f5 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffe8e8e8', endColorstr='#fff5f5f5', GradientType=0); - background-repeat: repeat-x; - border-color: #dcdcdc; - -webkit-box-shadow: inset 0 1px 3px rgba(0, 0, 0, .05), 0 1px 0 rgba(255, 255, 255, .1); - box-shadow: inset 0 1px 3px rgba(0, 0, 0, .05), 0 1px 0 rgba(255, 255, 255, .1); -} -/*# sourceMappingURL=bootstrap-theme.css.map */ diff --git a/www/bootstrap-3.3.1/css/bootstrap-theme.min.css b/www/bootstrap-3.3.1/css/bootstrap-theme.min.css deleted file mode 100644 index 4c3e7ba..0000000 --- a/www/bootstrap-3.3.1/css/bootstrap-theme.min.css +++ /dev/null @@ -1,5 +0,0 @@ -/*! - * Bootstrap v3.3.1 (http://getbootstrap.com) - * Copyright 2011-2014 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE) - */.btn-default,.btn-primary,.btn-success,.btn-info,.btn-warning,.btn-danger{text-shadow:0 -1px 0 rgba(0,0,0,.2);-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,.15),0 1px 1px rgba(0,0,0,.075);box-shadow:inset 0 1px 0 rgba(255,255,255,.15),0 1px 1px rgba(0,0,0,.075)}.btn-default:active,.btn-primary:active,.btn-success:active,.btn-info:active,.btn-warning:active,.btn-danger:active,.btn-default.active,.btn-primary.active,.btn-success.active,.btn-info.active,.btn-warning.active,.btn-danger.active{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,.125);box-shadow:inset 0 3px 5px rgba(0,0,0,.125)}.btn-default .badge,.btn-primary .badge,.btn-success .badge,.btn-info .badge,.btn-warning .badge,.btn-danger .badge{text-shadow:none}.btn:active,.btn.active{background-image:none}.btn-default{text-shadow:0 1px 0 #fff;background-image:-webkit-linear-gradient(top,#fff 0,#e0e0e0 100%);background-image:-o-linear-gradient(top,#fff 0,#e0e0e0 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#fff),to(#e0e0e0));background-image:linear-gradient(to bottom,#fff 0,#e0e0e0 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffffffff', endColorstr='#ffe0e0e0', GradientType=0);filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);background-repeat:repeat-x;border-color:#dbdbdb;border-color:#ccc}.btn-default:hover,.btn-default:focus{background-color:#e0e0e0;background-position:0 -15px}.btn-default:active,.btn-default.active{background-color:#e0e0e0;border-color:#dbdbdb}.btn-default:disabled,.btn-default[disabled]{background-color:#e0e0e0;background-image:none}.btn-primary{background-image:-webkit-linear-gradient(top,#337ab7 0,#265a88 100%);background-image:-o-linear-gradient(top,#337ab7 0,#265a88 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#337ab7),to(#265a88));background-image:linear-gradient(to bottom,#337ab7 0,#265a88 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff265a88', GradientType=0);filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);background-repeat:repeat-x;border-color:#245580}.btn-primary:hover,.btn-primary:focus{background-color:#265a88;background-position:0 -15px}.btn-primary:active,.btn-primary.active{background-color:#265a88;border-color:#245580}.btn-primary:disabled,.btn-primary[disabled]{background-color:#265a88;background-image:none}.btn-success{background-image:-webkit-linear-gradient(top,#5cb85c 0,#419641 100%);background-image:-o-linear-gradient(top,#5cb85c 0,#419641 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#5cb85c),to(#419641));background-image:linear-gradient(to bottom,#5cb85c 0,#419641 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5cb85c', endColorstr='#ff419641', GradientType=0);filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);background-repeat:repeat-x;border-color:#3e8f3e}.btn-success:hover,.btn-success:focus{background-color:#419641;background-position:0 -15px}.btn-success:active,.btn-success.active{background-color:#419641;border-color:#3e8f3e}.btn-success:disabled,.btn-success[disabled]{background-color:#419641;background-image:none}.btn-info{background-image:-webkit-linear-gradient(top,#5bc0de 0,#2aabd2 100%);background-image:-o-linear-gradient(top,#5bc0de 0,#2aabd2 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#5bc0de),to(#2aabd2));background-image:linear-gradient(to bottom,#5bc0de 0,#2aabd2 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5bc0de', endColorstr='#ff2aabd2', GradientType=0);filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);background-repeat:repeat-x;border-color:#28a4c9}.btn-info:hover,.btn-info:focus{background-color:#2aabd2;background-position:0 -15px}.btn-info:active,.btn-info.active{background-color:#2aabd2;border-color:#28a4c9}.btn-info:disabled,.btn-info[disabled]{background-color:#2aabd2;background-image:none}.btn-warning{background-image:-webkit-linear-gradient(top,#f0ad4e 0,#eb9316 100%);background-image:-o-linear-gradient(top,#f0ad4e 0,#eb9316 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#f0ad4e),to(#eb9316));background-image:linear-gradient(to bottom,#f0ad4e 0,#eb9316 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff0ad4e', endColorstr='#ffeb9316', GradientType=0);filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);background-repeat:repeat-x;border-color:#e38d13}.btn-warning:hover,.btn-warning:focus{background-color:#eb9316;background-position:0 -15px}.btn-warning:active,.btn-warning.active{background-color:#eb9316;border-color:#e38d13}.btn-warning:disabled,.btn-warning[disabled]{background-color:#eb9316;background-image:none}.btn-danger{background-image:-webkit-linear-gradient(top,#d9534f 0,#c12e2a 100%);background-image:-o-linear-gradient(top,#d9534f 0,#c12e2a 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#d9534f),to(#c12e2a));background-image:linear-gradient(to bottom,#d9534f 0,#c12e2a 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffd9534f', endColorstr='#ffc12e2a', GradientType=0);filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);background-repeat:repeat-x;border-color:#b92c28}.btn-danger:hover,.btn-danger:focus{background-color:#c12e2a;background-position:0 -15px}.btn-danger:active,.btn-danger.active{background-color:#c12e2a;border-color:#b92c28}.btn-danger:disabled,.btn-danger[disabled]{background-color:#c12e2a;background-image:none}.thumbnail,.img-thumbnail{-webkit-box-shadow:0 1px 2px rgba(0,0,0,.075);box-shadow:0 1px 2px rgba(0,0,0,.075)}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{background-color:#e8e8e8;background-image:-webkit-linear-gradient(top,#f5f5f5 0,#e8e8e8 100%);background-image:-o-linear-gradient(top,#f5f5f5 0,#e8e8e8 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#f5f5f5),to(#e8e8e8));background-image:linear-gradient(to bottom,#f5f5f5 0,#e8e8e8 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff5f5f5', endColorstr='#ffe8e8e8', GradientType=0);background-repeat:repeat-x}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{background-color:#2e6da4;background-image:-webkit-linear-gradient(top,#337ab7 0,#2e6da4 100%);background-image:-o-linear-gradient(top,#337ab7 0,#2e6da4 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#337ab7),to(#2e6da4));background-image:linear-gradient(to bottom,#337ab7 0,#2e6da4 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff2e6da4', GradientType=0);background-repeat:repeat-x}.navbar-default{background-image:-webkit-linear-gradient(top,#fff 0,#f8f8f8 100%);background-image:-o-linear-gradient(top,#fff 0,#f8f8f8 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#fff),to(#f8f8f8));background-image:linear-gradient(to bottom,#fff 0,#f8f8f8 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffffffff', endColorstr='#fff8f8f8', GradientType=0);filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);background-repeat:repeat-x;border-radius:4px;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,.15),0 1px 5px rgba(0,0,0,.075);box-shadow:inset 0 1px 0 rgba(255,255,255,.15),0 1px 5px rgba(0,0,0,.075)}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.active>a{background-image:-webkit-linear-gradient(top,#dbdbdb 0,#e2e2e2 100%);background-image:-o-linear-gradient(top,#dbdbdb 0,#e2e2e2 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#dbdbdb),to(#e2e2e2));background-image:linear-gradient(to bottom,#dbdbdb 0,#e2e2e2 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffdbdbdb', endColorstr='#ffe2e2e2', GradientType=0);background-repeat:repeat-x;-webkit-box-shadow:inset 0 3px 9px rgba(0,0,0,.075);box-shadow:inset 0 3px 9px rgba(0,0,0,.075)}.navbar-brand,.navbar-nav>li>a{text-shadow:0 1px 0 rgba(255,255,255,.25)}.navbar-inverse{background-image:-webkit-linear-gradient(top,#3c3c3c 0,#222 100%);background-image:-o-linear-gradient(top,#3c3c3c 0,#222 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#3c3c3c),to(#222));background-image:linear-gradient(to bottom,#3c3c3c 0,#222 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff3c3c3c', endColorstr='#ff222222', GradientType=0);filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);background-repeat:repeat-x}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.active>a{background-image:-webkit-linear-gradient(top,#080808 0,#0f0f0f 100%);background-image:-o-linear-gradient(top,#080808 0,#0f0f0f 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#080808),to(#0f0f0f));background-image:linear-gradient(to bottom,#080808 0,#0f0f0f 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff080808', endColorstr='#ff0f0f0f', GradientType=0);background-repeat:repeat-x;-webkit-box-shadow:inset 0 3px 9px rgba(0,0,0,.25);box-shadow:inset 0 3px 9px rgba(0,0,0,.25)}.navbar-inverse .navbar-brand,.navbar-inverse .navbar-nav>li>a{text-shadow:0 -1px 0 rgba(0,0,0,.25)}.navbar-static-top,.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}@media (max-width:767px){.navbar .navbar-nav .open .dropdown-menu>.active>a,.navbar .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar .navbar-nav .open .dropdown-menu>.active>a:focus{color:#fff;background-image:-webkit-linear-gradient(top,#337ab7 0,#2e6da4 100%);background-image:-o-linear-gradient(top,#337ab7 0,#2e6da4 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#337ab7),to(#2e6da4));background-image:linear-gradient(to bottom,#337ab7 0,#2e6da4 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff2e6da4', GradientType=0);background-repeat:repeat-x}}.alert{text-shadow:0 1px 0 rgba(255,255,255,.2);-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,.25),0 1px 2px rgba(0,0,0,.05);box-shadow:inset 0 1px 0 rgba(255,255,255,.25),0 1px 2px rgba(0,0,0,.05)}.alert-success{background-image:-webkit-linear-gradient(top,#dff0d8 0,#c8e5bc 100%);background-image:-o-linear-gradient(top,#dff0d8 0,#c8e5bc 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#dff0d8),to(#c8e5bc));background-image:linear-gradient(to bottom,#dff0d8 0,#c8e5bc 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffdff0d8', endColorstr='#ffc8e5bc', GradientType=0);background-repeat:repeat-x;border-color:#b2dba1}.alert-info{background-image:-webkit-linear-gradient(top,#d9edf7 0,#b9def0 100%);background-image:-o-linear-gradient(top,#d9edf7 0,#b9def0 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#d9edf7),to(#b9def0));background-image:linear-gradient(to bottom,#d9edf7 0,#b9def0 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffd9edf7', endColorstr='#ffb9def0', GradientType=0);background-repeat:repeat-x;border-color:#9acfea}.alert-warning{background-image:-webkit-linear-gradient(top,#fcf8e3 0,#f8efc0 100%);background-image:-o-linear-gradient(top,#fcf8e3 0,#f8efc0 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#fcf8e3),to(#f8efc0));background-image:linear-gradient(to bottom,#fcf8e3 0,#f8efc0 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#fffcf8e3', endColorstr='#fff8efc0', GradientType=0);background-repeat:repeat-x;border-color:#f5e79e}.alert-danger{background-image:-webkit-linear-gradient(top,#f2dede 0,#e7c3c3 100%);background-image:-o-linear-gradient(top,#f2dede 0,#e7c3c3 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#f2dede),to(#e7c3c3));background-image:linear-gradient(to bottom,#f2dede 0,#e7c3c3 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff2dede', endColorstr='#ffe7c3c3', GradientType=0);background-repeat:repeat-x;border-color:#dca7a7}.progress{background-image:-webkit-linear-gradient(top,#ebebeb 0,#f5f5f5 100%);background-image:-o-linear-gradient(top,#ebebeb 0,#f5f5f5 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#ebebeb),to(#f5f5f5));background-image:linear-gradient(to bottom,#ebebeb 0,#f5f5f5 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffebebeb', endColorstr='#fff5f5f5', GradientType=0);background-repeat:repeat-x}.progress-bar{background-image:-webkit-linear-gradient(top,#337ab7 0,#286090 100%);background-image:-o-linear-gradient(top,#337ab7 0,#286090 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#337ab7),to(#286090));background-image:linear-gradient(to bottom,#337ab7 0,#286090 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff286090', GradientType=0);background-repeat:repeat-x}.progress-bar-success{background-image:-webkit-linear-gradient(top,#5cb85c 0,#449d44 100%);background-image:-o-linear-gradient(top,#5cb85c 0,#449d44 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#5cb85c),to(#449d44));background-image:linear-gradient(to bottom,#5cb85c 0,#449d44 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5cb85c', endColorstr='#ff449d44', GradientType=0);background-repeat:repeat-x}.progress-bar-info{background-image:-webkit-linear-gradient(top,#5bc0de 0,#31b0d5 100%);background-image:-o-linear-gradient(top,#5bc0de 0,#31b0d5 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#5bc0de),to(#31b0d5));background-image:linear-gradient(to bottom,#5bc0de 0,#31b0d5 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5bc0de', endColorstr='#ff31b0d5', GradientType=0);background-repeat:repeat-x}.progress-bar-warning{background-image:-webkit-linear-gradient(top,#f0ad4e 0,#ec971f 100%);background-image:-o-linear-gradient(top,#f0ad4e 0,#ec971f 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#f0ad4e),to(#ec971f));background-image:linear-gradient(to bottom,#f0ad4e 0,#ec971f 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff0ad4e', endColorstr='#ffec971f', GradientType=0);background-repeat:repeat-x}.progress-bar-danger{background-image:-webkit-linear-gradient(top,#d9534f 0,#c9302c 100%);background-image:-o-linear-gradient(top,#d9534f 0,#c9302c 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#d9534f),to(#c9302c));background-image:linear-gradient(to bottom,#d9534f 0,#c9302c 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffd9534f', endColorstr='#ffc9302c', GradientType=0);background-repeat:repeat-x}.progress-bar-striped{background-image:-webkit-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:-o-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent)}.list-group{border-radius:4px;-webkit-box-shadow:0 1px 2px rgba(0,0,0,.075);box-shadow:0 1px 2px rgba(0,0,0,.075)}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{text-shadow:0 -1px 0 #286090;background-image:-webkit-linear-gradient(top,#337ab7 0,#2b669a 100%);background-image:-o-linear-gradient(top,#337ab7 0,#2b669a 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#337ab7),to(#2b669a));background-image:linear-gradient(to bottom,#337ab7 0,#2b669a 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff2b669a', GradientType=0);background-repeat:repeat-x;border-color:#2b669a}.list-group-item.active .badge,.list-group-item.active:hover .badge,.list-group-item.active:focus .badge{text-shadow:none}.panel{-webkit-box-shadow:0 1px 2px rgba(0,0,0,.05);box-shadow:0 1px 2px rgba(0,0,0,.05)}.panel-default>.panel-heading{background-image:-webkit-linear-gradient(top,#f5f5f5 0,#e8e8e8 100%);background-image:-o-linear-gradient(top,#f5f5f5 0,#e8e8e8 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#f5f5f5),to(#e8e8e8));background-image:linear-gradient(to bottom,#f5f5f5 0,#e8e8e8 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff5f5f5', endColorstr='#ffe8e8e8', GradientType=0);background-repeat:repeat-x}.panel-primary>.panel-heading{background-image:-webkit-linear-gradient(top,#337ab7 0,#2e6da4 100%);background-image:-o-linear-gradient(top,#337ab7 0,#2e6da4 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#337ab7),to(#2e6da4));background-image:linear-gradient(to bottom,#337ab7 0,#2e6da4 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff337ab7', endColorstr='#ff2e6da4', GradientType=0);background-repeat:repeat-x}.panel-success>.panel-heading{background-image:-webkit-linear-gradient(top,#dff0d8 0,#d0e9c6 100%);background-image:-o-linear-gradient(top,#dff0d8 0,#d0e9c6 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#dff0d8),to(#d0e9c6));background-image:linear-gradient(to bottom,#dff0d8 0,#d0e9c6 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffdff0d8', endColorstr='#ffd0e9c6', GradientType=0);background-repeat:repeat-x}.panel-info>.panel-heading{background-image:-webkit-linear-gradient(top,#d9edf7 0,#c4e3f3 100%);background-image:-o-linear-gradient(top,#d9edf7 0,#c4e3f3 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#d9edf7),to(#c4e3f3));background-image:linear-gradient(to bottom,#d9edf7 0,#c4e3f3 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffd9edf7', endColorstr='#ffc4e3f3', GradientType=0);background-repeat:repeat-x}.panel-warning>.panel-heading{background-image:-webkit-linear-gradient(top,#fcf8e3 0,#faf2cc 100%);background-image:-o-linear-gradient(top,#fcf8e3 0,#faf2cc 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#fcf8e3),to(#faf2cc));background-image:linear-gradient(to bottom,#fcf8e3 0,#faf2cc 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#fffcf8e3', endColorstr='#fffaf2cc', GradientType=0);background-repeat:repeat-x}.panel-danger>.panel-heading{background-image:-webkit-linear-gradient(top,#f2dede 0,#ebcccc 100%);background-image:-o-linear-gradient(top,#f2dede 0,#ebcccc 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#f2dede),to(#ebcccc));background-image:linear-gradient(to bottom,#f2dede 0,#ebcccc 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#fff2dede', endColorstr='#ffebcccc', GradientType=0);background-repeat:repeat-x}.well{background-image:-webkit-linear-gradient(top,#e8e8e8 0,#f5f5f5 100%);background-image:-o-linear-gradient(top,#e8e8e8 0,#f5f5f5 100%);background-image:-webkit-gradient(linear,left top,left bottom,from(#e8e8e8),to(#f5f5f5));background-image:linear-gradient(to bottom,#e8e8e8 0,#f5f5f5 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffe8e8e8', endColorstr='#fff5f5f5', GradientType=0);background-repeat:repeat-x;border-color:#dcdcdc;-webkit-box-shadow:inset 0 1px 3px rgba(0,0,0,.05),0 1px 0 rgba(255,255,255,.1);box-shadow:inset 0 1px 3px rgba(0,0,0,.05),0 1px 0 rgba(255,255,255,.1)} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/css/bootstrap.css b/www/bootstrap-3.3.1/css/bootstrap.css deleted file mode 100644 index 3edee86..0000000 --- a/www/bootstrap-3.3.1/css/bootstrap.css +++ /dev/null @@ -1,6331 +0,0 @@ -/*! - * Bootstrap v3.3.1 (http://getbootstrap.com) - * Copyright 2011-2014 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE) - */ - -/*! normalize.css v3.0.2 | MIT License | git.io/normalize */ -html { - font-family: sans-serif; - -webkit-text-size-adjust: 100%; - -ms-text-size-adjust: 100%; -} -body { - margin: 0; -} -article, -aside, -details, -figcaption, -figure, -footer, -header, -hgroup, -main, -menu, -nav, -section, -summary { - display: block; -} -audio, -canvas, -progress, -video { - display: inline-block; - vertical-align: baseline; -} -audio:not([controls]) { - display: none; - height: 0; -} -[hidden], -template { - display: none; -} -a { - background-color: transparent; -} -a:active, -a:hover { - outline: 0; -} -abbr[title] { - border-bottom: 1px dotted; -} -b, -strong { - font-weight: bold; -} -dfn { - font-style: italic; -} -h1 { - margin: .67em 0; - font-size: 2em; -} -mark { - color: #000; - background: #ff0; -} -small { - font-size: 80%; -} -sub, -sup { - position: relative; - font-size: 75%; - line-height: 0; - vertical-align: baseline; -} -sup { - top: -.5em; -} -sub { - bottom: -.25em; -} -img { - border: 0; -} -svg:not(:root) { - overflow: hidden; -} -figure { - margin: 1em 40px; -} -hr { - height: 0; - -webkit-box-sizing: content-box; - -moz-box-sizing: content-box; - box-sizing: content-box; -} -pre { - overflow: auto; -} -code, -kbd, -pre, -samp { - font-family: monospace, monospace; - font-size: 1em; -} -button, -input, -optgroup, -select, -textarea { - margin: 0; - font: inherit; - color: inherit; -} -button { - overflow: visible; -} -button, -select { - text-transform: none; -} -button, -html input[type="button"], -input[type="reset"], -input[type="submit"] { - -webkit-appearance: button; - cursor: pointer; -} -button[disabled], -html input[disabled] { - cursor: default; -} -button::-moz-focus-inner, -input::-moz-focus-inner { - padding: 0; - border: 0; -} -input { - line-height: normal; -} -input[type="checkbox"], -input[type="radio"] { - -webkit-box-sizing: border-box; - -moz-box-sizing: border-box; - box-sizing: border-box; - padding: 0; -} -input[type="number"]::-webkit-inner-spin-button, -input[type="number"]::-webkit-outer-spin-button { - height: auto; -} -input[type="search"] { - -webkit-box-sizing: content-box; - -moz-box-sizing: content-box; - box-sizing: content-box; - -webkit-appearance: textfield; -} -input[type="search"]::-webkit-search-cancel-button, -input[type="search"]::-webkit-search-decoration { - -webkit-appearance: none; -} -fieldset { - padding: .35em .625em .75em; - margin: 0 2px; - border: 1px solid #c0c0c0; -} -legend { - padding: 0; - border: 0; -} -textarea { - overflow: auto; -} -optgroup { - font-weight: bold; -} -table { - border-spacing: 0; - border-collapse: collapse; -} -td, -th { - padding: 0; -} -/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */ -@media print { - *, - *:before, - *:after { - color: #000 !important; - text-shadow: none !important; - background: transparent !important; - -webkit-box-shadow: none !important; - box-shadow: none !important; - } - a, - a:visited { - text-decoration: underline; - } - a[href]:after { - content: " (" attr(href) ")"; - } - abbr[title]:after { - content: " (" attr(title) ")"; - } - a[href^="#"]:after, - a[href^="javascript:"]:after { - content: ""; - } - pre, - blockquote { - border: 1px solid #999; - - page-break-inside: avoid; - } - thead { - display: table-header-group; - } - tr, - img { - page-break-inside: avoid; - } - img { - max-width: 100% !important; - } - p, - h2, - h3 { - orphans: 3; - widows: 3; - } - h2, - h3 { - page-break-after: avoid; - } - select { - background: #fff !important; - } - .navbar { - display: none; - } - .btn > .caret, - .dropup > .btn > .caret { - border-top-color: #000 !important; - } - .label { - border: 1px solid #000; - } - .table { - border-collapse: collapse !important; - } - .table td, - .table th { - background-color: #fff !important; - } - .table-bordered th, - .table-bordered td { - border: 1px solid #ddd !important; - } -} -@font-face { - font-family: 'Glyphicons Halflings'; - - src: url('../fonts/glyphicons-halflings-regular.eot'); - src: url('../fonts/glyphicons-halflings-regular.eot?#iefix') format('embedded-opentype'), url('../fonts/glyphicons-halflings-regular.woff') format('woff'), url('../fonts/glyphicons-halflings-regular.ttf') format('truetype'), url('../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular') format('svg'); -} -.glyphicon { - position: relative; - top: 1px; - display: inline-block; - font-family: 'Glyphicons Halflings'; - font-style: normal; - font-weight: normal; - line-height: 1; - - -webkit-font-smoothing: antialiased; - -moz-osx-font-smoothing: grayscale; -} -.glyphicon-asterisk:before { - content: "\2a"; -} -.glyphicon-plus:before { - content: "\2b"; -} -.glyphicon-euro:before, -.glyphicon-eur:before { - content: "\20ac"; -} -.glyphicon-minus:before { - content: "\2212"; -} -.glyphicon-cloud:before { - content: "\2601"; -} -.glyphicon-envelope:before { - content: "\2709"; -} -.glyphicon-pencil:before { - content: "\270f"; -} -.glyphicon-glass:before { - content: "\e001"; -} -.glyphicon-music:before { - content: "\e002"; -} -.glyphicon-search:before { - content: "\e003"; -} -.glyphicon-heart:before { - content: "\e005"; -} -.glyphicon-star:before { - content: "\e006"; -} -.glyphicon-star-empty:before { - content: "\e007"; -} -.glyphicon-user:before { - content: "\e008"; -} -.glyphicon-film:before { - content: "\e009"; -} -.glyphicon-th-large:before { - content: "\e010"; -} -.glyphicon-th:before { - content: "\e011"; -} -.glyphicon-th-list:before { - content: "\e012"; -} -.glyphicon-ok:before { - content: "\e013"; -} -.glyphicon-remove:before { - content: "\e014"; -} -.glyphicon-zoom-in:before { - content: "\e015"; -} -.glyphicon-zoom-out:before { - content: "\e016"; -} -.glyphicon-off:before { - content: "\e017"; -} -.glyphicon-signal:before { - content: "\e018"; -} -.glyphicon-cog:before { - content: "\e019"; -} -.glyphicon-trash:before { - content: "\e020"; -} -.glyphicon-home:before { - content: "\e021"; -} -.glyphicon-file:before { - content: "\e022"; -} -.glyphicon-time:before { - content: "\e023"; -} -.glyphicon-road:before { - content: "\e024"; -} -.glyphicon-download-alt:before { - content: "\e025"; -} -.glyphicon-download:before { - content: "\e026"; -} -.glyphicon-upload:before { - content: "\e027"; -} -.glyphicon-inbox:before { - content: "\e028"; -} -.glyphicon-play-circle:before { - content: "\e029"; -} -.glyphicon-repeat:before { - content: "\e030"; -} -.glyphicon-refresh:before { - content: "\e031"; -} -.glyphicon-list-alt:before { - content: "\e032"; -} -.glyphicon-lock:before { - content: "\e033"; -} -.glyphicon-flag:before { - content: "\e034"; -} -.glyphicon-headphones:before { - content: "\e035"; -} -.glyphicon-volume-off:before { - content: "\e036"; -} -.glyphicon-volume-down:before { - content: "\e037"; -} -.glyphicon-volume-up:before { - content: "\e038"; -} -.glyphicon-qrcode:before { - content: "\e039"; -} -.glyphicon-barcode:before { - content: "\e040"; -} -.glyphicon-tag:before { - content: "\e041"; -} -.glyphicon-tags:before { - content: "\e042"; -} -.glyphicon-book:before { - content: "\e043"; -} -.glyphicon-bookmark:before { - content: "\e044"; -} -.glyphicon-print:before { - content: "\e045"; -} -.glyphicon-camera:before { - content: "\e046"; -} -.glyphicon-font:before { - content: "\e047"; -} -.glyphicon-bold:before { - content: "\e048"; -} -.glyphicon-italic:before { - content: "\e049"; -} -.glyphicon-text-height:before { - content: "\e050"; -} -.glyphicon-text-width:before { - content: "\e051"; -} -.glyphicon-align-left:before { - content: "\e052"; -} -.glyphicon-align-center:before { - content: "\e053"; -} -.glyphicon-align-right:before { - content: "\e054"; -} -.glyphicon-align-justify:before { - content: "\e055"; -} -.glyphicon-list:before { - content: "\e056"; -} -.glyphicon-indent-left:before { - content: "\e057"; -} -.glyphicon-indent-right:before { - content: "\e058"; -} -.glyphicon-facetime-video:before { - content: "\e059"; -} -.glyphicon-picture:before { - content: "\e060"; -} -.glyphicon-map-marker:before { - content: "\e062"; -} -.glyphicon-adjust:before { - content: "\e063"; -} -.glyphicon-tint:before { - content: "\e064"; -} -.glyphicon-edit:before { - content: "\e065"; -} -.glyphicon-share:before { - content: "\e066"; -} -.glyphicon-check:before { - content: "\e067"; -} -.glyphicon-move:before { - content: "\e068"; -} -.glyphicon-step-backward:before { - content: "\e069"; -} -.glyphicon-fast-backward:before { - content: "\e070"; -} -.glyphicon-backward:before { - content: "\e071"; -} -.glyphicon-play:before { - content: "\e072"; -} -.glyphicon-pause:before { - content: "\e073"; -} -.glyphicon-stop:before { - content: "\e074"; -} -.glyphicon-forward:before { - content: "\e075"; -} -.glyphicon-fast-forward:before { - content: "\e076"; -} -.glyphicon-step-forward:before { - content: "\e077"; -} -.glyphicon-eject:before { - content: "\e078"; -} -.glyphicon-chevron-left:before { - content: "\e079"; -} -.glyphicon-chevron-right:before { - content: "\e080"; -} -.glyphicon-plus-sign:before { - content: "\e081"; -} -.glyphicon-minus-sign:before { - content: "\e082"; -} -.glyphicon-remove-sign:before { - content: "\e083"; -} -.glyphicon-ok-sign:before { - content: "\e084"; -} -.glyphicon-question-sign:before { - content: "\e085"; -} -.glyphicon-info-sign:before { - content: "\e086"; -} -.glyphicon-screenshot:before { - content: "\e087"; -} -.glyphicon-remove-circle:before { - content: "\e088"; -} -.glyphicon-ok-circle:before { - content: "\e089"; -} -.glyphicon-ban-circle:before { - content: "\e090"; -} -.glyphicon-arrow-left:before { - content: "\e091"; -} -.glyphicon-arrow-right:before { - content: "\e092"; -} -.glyphicon-arrow-up:before { - content: "\e093"; -} -.glyphicon-arrow-down:before { - content: "\e094"; -} -.glyphicon-share-alt:before { - content: "\e095"; -} -.glyphicon-resize-full:before { - content: "\e096"; -} -.glyphicon-resize-small:before { - content: "\e097"; -} -.glyphicon-exclamation-sign:before { - content: "\e101"; -} -.glyphicon-gift:before { - content: "\e102"; -} -.glyphicon-leaf:before { - content: "\e103"; -} -.glyphicon-fire:before { - content: "\e104"; -} -.glyphicon-eye-open:before { - content: "\e105"; -} -.glyphicon-eye-close:before { - content: "\e106"; -} -.glyphicon-warning-sign:before { - content: "\e107"; -} -.glyphicon-plane:before { - content: "\e108"; -} -.glyphicon-calendar:before { - content: "\e109"; -} -.glyphicon-random:before { - content: "\e110"; -} -.glyphicon-comment:before { - content: "\e111"; -} -.glyphicon-magnet:before { - content: "\e112"; -} -.glyphicon-chevron-up:before { - content: "\e113"; -} -.glyphicon-chevron-down:before { - content: "\e114"; -} -.glyphicon-retweet:before { - content: "\e115"; -} -.glyphicon-shopping-cart:before { - content: "\e116"; -} -.glyphicon-folder-close:before { - content: "\e117"; -} -.glyphicon-folder-open:before { - content: "\e118"; -} -.glyphicon-resize-vertical:before { - content: "\e119"; -} -.glyphicon-resize-horizontal:before { - content: "\e120"; -} -.glyphicon-hdd:before { - content: "\e121"; -} -.glyphicon-bullhorn:before { - content: "\e122"; -} -.glyphicon-bell:before { - content: "\e123"; -} -.glyphicon-certificate:before { - content: "\e124"; -} -.glyphicon-thumbs-up:before { - content: "\e125"; -} -.glyphicon-thumbs-down:before { - content: "\e126"; -} -.glyphicon-hand-right:before { - content: "\e127"; -} -.glyphicon-hand-left:before { - content: "\e128"; -} -.glyphicon-hand-up:before { - content: "\e129"; -} -.glyphicon-hand-down:before { - content: "\e130"; -} -.glyphicon-circle-arrow-right:before { - content: "\e131"; -} -.glyphicon-circle-arrow-left:before { - content: "\e132"; -} -.glyphicon-circle-arrow-up:before { - content: "\e133"; -} -.glyphicon-circle-arrow-down:before { - content: "\e134"; -} -.glyphicon-globe:before { - content: "\e135"; -} -.glyphicon-wrench:before { - content: "\e136"; -} -.glyphicon-tasks:before { - content: "\e137"; -} -.glyphicon-filter:before { - content: "\e138"; -} -.glyphicon-briefcase:before { - content: "\e139"; -} -.glyphicon-fullscreen:before { - content: "\e140"; -} -.glyphicon-dashboard:before { - content: "\e141"; -} -.glyphicon-paperclip:before { - content: "\e142"; -} -.glyphicon-heart-empty:before { - content: "\e143"; -} -.glyphicon-link:before { - content: "\e144"; -} -.glyphicon-phone:before { - content: "\e145"; -} -.glyphicon-pushpin:before { - content: "\e146"; -} -.glyphicon-usd:before { - content: "\e148"; -} -.glyphicon-gbp:before { - content: "\e149"; -} -.glyphicon-sort:before { - content: "\e150"; -} -.glyphicon-sort-by-alphabet:before { - content: "\e151"; -} -.glyphicon-sort-by-alphabet-alt:before { - content: "\e152"; -} -.glyphicon-sort-by-order:before { - content: "\e153"; -} -.glyphicon-sort-by-order-alt:before { - content: "\e154"; -} -.glyphicon-sort-by-attributes:before { - content: "\e155"; -} -.glyphicon-sort-by-attributes-alt:before { - content: "\e156"; -} -.glyphicon-unchecked:before { - content: "\e157"; -} -.glyphicon-expand:before { - content: "\e158"; -} -.glyphicon-collapse-down:before { - content: "\e159"; -} -.glyphicon-collapse-up:before { - content: "\e160"; -} -.glyphicon-log-in:before { - content: "\e161"; -} -.glyphicon-flash:before { - content: "\e162"; -} -.glyphicon-log-out:before { - content: "\e163"; -} -.glyphicon-new-window:before { - content: "\e164"; -} -.glyphicon-record:before { - content: "\e165"; -} -.glyphicon-save:before { - content: "\e166"; -} -.glyphicon-open:before { - content: "\e167"; -} -.glyphicon-saved:before { - content: "\e168"; -} -.glyphicon-import:before { - content: "\e169"; -} -.glyphicon-export:before { - content: "\e170"; -} -.glyphicon-send:before { - content: "\e171"; -} -.glyphicon-floppy-disk:before { - content: "\e172"; -} -.glyphicon-floppy-saved:before { - content: "\e173"; -} -.glyphicon-floppy-remove:before { - content: "\e174"; -} -.glyphicon-floppy-save:before { - content: "\e175"; -} -.glyphicon-floppy-open:before { - content: "\e176"; -} -.glyphicon-credit-card:before { - content: "\e177"; -} -.glyphicon-transfer:before { - content: "\e178"; -} -.glyphicon-cutlery:before { - content: "\e179"; -} -.glyphicon-header:before { - content: "\e180"; -} -.glyphicon-compressed:before { - content: "\e181"; -} -.glyphicon-earphone:before { - content: "\e182"; -} -.glyphicon-phone-alt:before { - content: "\e183"; -} -.glyphicon-tower:before { - content: "\e184"; -} -.glyphicon-stats:before { - content: "\e185"; -} -.glyphicon-sd-video:before { - content: "\e186"; -} -.glyphicon-hd-video:before { - content: "\e187"; -} -.glyphicon-subtitles:before { - content: "\e188"; -} -.glyphicon-sound-stereo:before { - content: "\e189"; -} -.glyphicon-sound-dolby:before { - content: "\e190"; -} -.glyphicon-sound-5-1:before { - content: "\e191"; -} -.glyphicon-sound-6-1:before { - content: "\e192"; -} -.glyphicon-sound-7-1:before { - content: "\e193"; -} -.glyphicon-copyright-mark:before { - content: "\e194"; -} -.glyphicon-registration-mark:before { - content: "\e195"; -} -.glyphicon-cloud-download:before { - content: "\e197"; -} -.glyphicon-cloud-upload:before { - content: "\e198"; -} -.glyphicon-tree-conifer:before { - content: "\e199"; -} -.glyphicon-tree-deciduous:before { - content: "\e200"; -} -* { - -webkit-box-sizing: border-box; - -moz-box-sizing: border-box; - box-sizing: border-box; -} -*:before, -*:after { - -webkit-box-sizing: border-box; - -moz-box-sizing: border-box; - box-sizing: border-box; -} -html { - font-size: 10px; - - -webkit-tap-highlight-color: rgba(0, 0, 0, 0); -} -body { - font-family: "Helvetica Neue", Helvetica, Arial, sans-serif; - font-size: 14px; - line-height: 1.42857143; - color: #333; - background-color: #fff; -} -input, -button, -select, -textarea { - font-family: inherit; - font-size: inherit; - line-height: inherit; -} -a { - color: #337ab7; - text-decoration: none; -} -a:hover, -a:focus { - color: #23527c; - text-decoration: underline; -} -a:focus { - outline: thin dotted; - outline: 5px auto -webkit-focus-ring-color; - outline-offset: -2px; -} -figure { - margin: 0; -} -img { - vertical-align: middle; -} -.img-responsive, -.thumbnail > img, -.thumbnail a > img, -.carousel-inner > .item > img, -.carousel-inner > .item > a > img { - display: block; - max-width: 100%; - height: auto; -} -.img-rounded { - border-radius: 6px; -} -.img-thumbnail { - display: inline-block; - max-width: 100%; - height: auto; - padding: 4px; - line-height: 1.42857143; - background-color: #fff; - border: 1px solid #ddd; - border-radius: 4px; - -webkit-transition: all .2s ease-in-out; - -o-transition: all .2s ease-in-out; - transition: all .2s ease-in-out; -} -.img-circle { - border-radius: 50%; -} -hr { - margin-top: 20px; - margin-bottom: 20px; - border: 0; - border-top: 1px solid #eee; -} -.sr-only { - position: absolute; - width: 1px; - height: 1px; - padding: 0; - margin: -1px; - overflow: hidden; - clip: rect(0, 0, 0, 0); - border: 0; -} -.sr-only-focusable:active, -.sr-only-focusable:focus { - position: static; - width: auto; - height: auto; - margin: 0; - overflow: visible; - clip: auto; -} -h1, -h2, -h3, -h4, -h5, -h6, -.h1, -.h2, -.h3, -.h4, -.h5, -.h6 { - font-family: inherit; - font-weight: 500; - line-height: 1.1; - color: inherit; -} -h1 small, -h2 small, -h3 small, -h4 small, -h5 small, -h6 small, -.h1 small, -.h2 small, -.h3 small, -.h4 small, -.h5 small, -.h6 small, -h1 .small, -h2 .small, -h3 .small, -h4 .small, -h5 .small, -h6 .small, -.h1 .small, -.h2 .small, -.h3 .small, -.h4 .small, -.h5 .small, -.h6 .small { - font-weight: normal; - line-height: 1; - color: #777; -} -h1, -.h1, -h2, -.h2, -h3, -.h3 { - margin-top: 20px; - margin-bottom: 10px; -} -h1 small, -.h1 small, -h2 small, -.h2 small, -h3 small, -.h3 small, -h1 .small, -.h1 .small, -h2 .small, -.h2 .small, -h3 .small, -.h3 .small { - font-size: 65%; -} -h4, -.h4, -h5, -.h5, -h6, -.h6 { - margin-top: 10px; - margin-bottom: 10px; -} -h4 small, -.h4 small, -h5 small, -.h5 small, -h6 small, -.h6 small, -h4 .small, -.h4 .small, -h5 .small, -.h5 .small, -h6 .small, -.h6 .small { - font-size: 75%; -} -h1, -.h1 { - font-size: 36px; -} -h2, -.h2 { - font-size: 30px; -} -h3, -.h3 { - font-size: 24px; -} -h4, -.h4 { - font-size: 18px; -} -h5, -.h5 { - font-size: 14px; -} -h6, -.h6 { - font-size: 12px; -} -p { - margin: 0 0 10px; -} -.lead { - margin-bottom: 20px; - font-size: 16px; - font-weight: 300; - line-height: 1.4; -} -@media (min-width: 768px) { - .lead { - font-size: 21px; - } -} -small, -.small { - font-size: 85%; -} -mark, -.mark { - padding: .2em; - background-color: #fcf8e3; -} -.text-left { - text-align: left; -} -.text-right { - text-align: right; -} -.text-center { - text-align: center; -} -.text-justify { - text-align: justify; -} -.text-nowrap { - white-space: nowrap; -} -.text-lowercase { - text-transform: lowercase; -} -.text-uppercase { - text-transform: uppercase; -} -.text-capitalize { - text-transform: capitalize; -} -.text-muted { - color: #777; -} -.text-primary { - color: #337ab7; -} -a.text-primary:hover { - color: #286090; -} -.text-success { - color: #3c763d; -} -a.text-success:hover { - color: #2b542c; -} -.text-info { - color: #31708f; -} -a.text-info:hover { - color: #245269; -} -.text-warning { - color: #8a6d3b; -} -a.text-warning:hover { - color: #66512c; -} -.text-danger { - color: #a94442; -} -a.text-danger:hover { - color: #843534; -} -.bg-primary { - color: #fff; - background-color: #337ab7; -} -a.bg-primary:hover { - background-color: #286090; -} -.bg-success { - background-color: #dff0d8; -} -a.bg-success:hover { - background-color: #c1e2b3; -} -.bg-info { - background-color: #d9edf7; -} -a.bg-info:hover { - background-color: #afd9ee; -} -.bg-warning { - background-color: #fcf8e3; -} -a.bg-warning:hover { - background-color: #f7ecb5; -} -.bg-danger { - background-color: #f2dede; -} -a.bg-danger:hover { - background-color: #e4b9b9; -} -.page-header { - padding-bottom: 9px; - margin: 40px 0 20px; - border-bottom: 1px solid #eee; -} -ul, -ol { - margin-top: 0; - margin-bottom: 10px; -} -ul ul, -ol ul, -ul ol, -ol ol { - margin-bottom: 0; -} -.list-unstyled { - padding-left: 0; - list-style: none; -} -.list-inline { - padding-left: 0; - margin-left: -5px; - list-style: none; -} -.list-inline > li { - display: inline-block; - padding-right: 5px; - padding-left: 5px; -} -dl { - margin-top: 0; - margin-bottom: 20px; -} -dt, -dd { - line-height: 1.42857143; -} -dt { - font-weight: bold; -} -dd { - margin-left: 0; -} -@media (min-width: 768px) { - .dl-horizontal dt { - float: left; - width: 160px; - overflow: hidden; - clear: left; - text-align: right; - text-overflow: ellipsis; - white-space: nowrap; - } - .dl-horizontal dd { - margin-left: 180px; - } -} -abbr[title], -abbr[data-original-title] { - cursor: help; - border-bottom: 1px dotted #777; -} -.initialism { - font-size: 90%; - text-transform: uppercase; -} -blockquote { - padding: 10px 20px; - margin: 0 0 20px; - font-size: 17.5px; - border-left: 5px solid #eee; -} -blockquote p:last-child, -blockquote ul:last-child, -blockquote ol:last-child { - margin-bottom: 0; -} -blockquote footer, -blockquote small, -blockquote .small { - display: block; - font-size: 80%; - line-height: 1.42857143; - color: #777; -} -blockquote footer:before, -blockquote small:before, -blockquote .small:before { - content: '\2014 \00A0'; -} -.blockquote-reverse, -blockquote.pull-right { - padding-right: 15px; - padding-left: 0; - text-align: right; - border-right: 5px solid #eee; - border-left: 0; -} -.blockquote-reverse footer:before, -blockquote.pull-right footer:before, -.blockquote-reverse small:before, -blockquote.pull-right small:before, -.blockquote-reverse .small:before, -blockquote.pull-right .small:before { - content: ''; -} -.blockquote-reverse footer:after, -blockquote.pull-right footer:after, -.blockquote-reverse small:after, -blockquote.pull-right small:after, -.blockquote-reverse .small:after, -blockquote.pull-right .small:after { - content: '\00A0 \2014'; -} -address { - margin-bottom: 20px; - font-style: normal; - line-height: 1.42857143; -} -code, -kbd, -pre, -samp { - font-family: monospace; -} -code { - padding: 2px 4px; - font-size: 90%; - color: #c7254e; - background-color: #f9f2f4; - border-radius: 4px; -} -kbd { - padding: 2px 4px; - font-size: 90%; - color: #fff; - background-color: #333; - border-radius: 3px; - -webkit-box-shadow: inset 0 -1px 0 rgba(0, 0, 0, .25); - box-shadow: inset 0 -1px 0 rgba(0, 0, 0, .25); -} -kbd kbd { - padding: 0; - font-size: 100%; - font-weight: bold; - -webkit-box-shadow: none; - box-shadow: none; -} -pre { - display: block; - padding: 9.5px; - margin: 0 0 10px; - font-size: 13px; - line-height: 1.42857143; - color: #333; - word-break: break-all; - word-wrap: break-word; - background-color: #f5f5f5; - border: 1px solid #ccc; - border-radius: 4px; -} -pre code { - padding: 0; - font-size: inherit; - color: inherit; - white-space: pre-wrap; - background-color: transparent; - border-radius: 0; -} -.pre-scrollable { - max-height: 340px; - overflow-y: scroll; -} -.container { - padding-right: 15px; - padding-left: 15px; - margin-right: auto; - margin-left: auto; -} -@media (min-width: 768px) { - .container { - width: 750px; - } -} -@media (min-width: 992px) { - .container { - width: 970px; - } -} -@media (min-width: 1200px) { - .container { - width: 1170px; - } -} -.container-fluid { - padding-right: 15px; - padding-left: 15px; - margin-right: auto; - margin-left: auto; -} -.row { - margin-right: -15px; - margin-left: -15px; -} -.col-xs-1, .col-sm-1, .col-md-1, .col-lg-1, .col-xs-2, .col-sm-2, .col-md-2, .col-lg-2, .col-xs-3, .col-sm-3, .col-md-3, .col-lg-3, .col-xs-4, .col-sm-4, .col-md-4, .col-lg-4, .col-xs-5, .col-sm-5, .col-md-5, .col-lg-5, .col-xs-6, .col-sm-6, .col-md-6, .col-lg-6, .col-xs-7, .col-sm-7, .col-md-7, .col-lg-7, .col-xs-8, .col-sm-8, .col-md-8, .col-lg-8, .col-xs-9, .col-sm-9, .col-md-9, .col-lg-9, .col-xs-10, .col-sm-10, .col-md-10, .col-lg-10, .col-xs-11, .col-sm-11, .col-md-11, .col-lg-11, .col-xs-12, .col-sm-12, .col-md-12, .col-lg-12 { - position: relative; - min-height: 1px; - padding-right: 15px; - padding-left: 15px; -} -.col-xs-1, .col-xs-2, .col-xs-3, .col-xs-4, .col-xs-5, .col-xs-6, .col-xs-7, .col-xs-8, .col-xs-9, .col-xs-10, .col-xs-11, .col-xs-12 { - float: left; -} -.col-xs-12 { - width: 100%; -} -.col-xs-11 { - width: 91.66666667%; -} -.col-xs-10 { - width: 83.33333333%; -} -.col-xs-9 { - width: 75%; -} -.col-xs-8 { - width: 66.66666667%; -} -.col-xs-7 { - width: 58.33333333%; -} -.col-xs-6 { - width: 50%; -} -.col-xs-5 { - width: 41.66666667%; -} -.col-xs-4 { - width: 33.33333333%; -} -.col-xs-3 { - width: 25%; -} -.col-xs-2 { - width: 16.66666667%; -} -.col-xs-1 { - width: 8.33333333%; -} -.col-xs-pull-12 { - right: 100%; -} -.col-xs-pull-11 { - right: 91.66666667%; -} -.col-xs-pull-10 { - right: 83.33333333%; -} -.col-xs-pull-9 { - right: 75%; -} -.col-xs-pull-8 { - right: 66.66666667%; -} -.col-xs-pull-7 { - right: 58.33333333%; -} -.col-xs-pull-6 { - right: 50%; -} -.col-xs-pull-5 { - right: 41.66666667%; -} -.col-xs-pull-4 { - right: 33.33333333%; -} -.col-xs-pull-3 { - right: 25%; -} -.col-xs-pull-2 { - right: 16.66666667%; -} -.col-xs-pull-1 { - right: 8.33333333%; -} -.col-xs-pull-0 { - right: auto; -} -.col-xs-push-12 { - left: 100%; -} -.col-xs-push-11 { - left: 91.66666667%; -} -.col-xs-push-10 { - left: 83.33333333%; -} -.col-xs-push-9 { - left: 75%; -} -.col-xs-push-8 { - left: 66.66666667%; -} -.col-xs-push-7 { - left: 58.33333333%; -} -.col-xs-push-6 { - left: 50%; -} -.col-xs-push-5 { - left: 41.66666667%; -} -.col-xs-push-4 { - left: 33.33333333%; -} -.col-xs-push-3 { - left: 25%; -} -.col-xs-push-2 { - left: 16.66666667%; -} -.col-xs-push-1 { - left: 8.33333333%; -} -.col-xs-push-0 { - left: auto; -} -.col-xs-offset-12 { - margin-left: 100%; -} -.col-xs-offset-11 { - margin-left: 91.66666667%; -} -.col-xs-offset-10 { - margin-left: 83.33333333%; -} -.col-xs-offset-9 { - margin-left: 75%; -} -.col-xs-offset-8 { - margin-left: 66.66666667%; -} -.col-xs-offset-7 { - margin-left: 58.33333333%; -} -.col-xs-offset-6 { - margin-left: 50%; -} -.col-xs-offset-5 { - margin-left: 41.66666667%; -} -.col-xs-offset-4 { - margin-left: 33.33333333%; -} -.col-xs-offset-3 { - margin-left: 25%; -} -.col-xs-offset-2 { - margin-left: 16.66666667%; -} -.col-xs-offset-1 { - margin-left: 8.33333333%; -} -.col-xs-offset-0 { - margin-left: 0; -} -@media (min-width: 768px) { - .col-sm-1, .col-sm-2, .col-sm-3, .col-sm-4, .col-sm-5, .col-sm-6, .col-sm-7, .col-sm-8, .col-sm-9, .col-sm-10, .col-sm-11, .col-sm-12 { - float: left; - } - .col-sm-12 { - width: 100%; - } - .col-sm-11 { - width: 91.66666667%; - } - .col-sm-10 { - width: 83.33333333%; - } - .col-sm-9 { - width: 75%; - } - .col-sm-8 { - width: 66.66666667%; - } - .col-sm-7 { - width: 58.33333333%; - } - .col-sm-6 { - width: 50%; - } - .col-sm-5 { - width: 41.66666667%; - } - .col-sm-4 { - width: 33.33333333%; - } - .col-sm-3 { - width: 25%; - } - .col-sm-2 { - width: 16.66666667%; - } - .col-sm-1 { - width: 8.33333333%; - } - .col-sm-pull-12 { - right: 100%; - } - .col-sm-pull-11 { - right: 91.66666667%; - } - .col-sm-pull-10 { - right: 83.33333333%; - } - .col-sm-pull-9 { - right: 75%; - } - .col-sm-pull-8 { - right: 66.66666667%; - } - .col-sm-pull-7 { - right: 58.33333333%; - } - .col-sm-pull-6 { - right: 50%; - } - .col-sm-pull-5 { - right: 41.66666667%; - } - .col-sm-pull-4 { - right: 33.33333333%; - } - .col-sm-pull-3 { - right: 25%; - } - .col-sm-pull-2 { - right: 16.66666667%; - } - .col-sm-pull-1 { - right: 8.33333333%; - } - .col-sm-pull-0 { - right: auto; - } - .col-sm-push-12 { - left: 100%; - } - .col-sm-push-11 { - left: 91.66666667%; - } - .col-sm-push-10 { - left: 83.33333333%; - } - .col-sm-push-9 { - left: 75%; - } - .col-sm-push-8 { - left: 66.66666667%; - } - .col-sm-push-7 { - left: 58.33333333%; - } - .col-sm-push-6 { - left: 50%; - } - .col-sm-push-5 { - left: 41.66666667%; - } - .col-sm-push-4 { - left: 33.33333333%; - } - .col-sm-push-3 { - left: 25%; - } - .col-sm-push-2 { - left: 16.66666667%; - } - .col-sm-push-1 { - left: 8.33333333%; - } - .col-sm-push-0 { - left: auto; - } - .col-sm-offset-12 { - margin-left: 100%; - } - .col-sm-offset-11 { - margin-left: 91.66666667%; - } - .col-sm-offset-10 { - margin-left: 83.33333333%; - } - .col-sm-offset-9 { - margin-left: 75%; - } - .col-sm-offset-8 { - margin-left: 66.66666667%; - } - .col-sm-offset-7 { - margin-left: 58.33333333%; - } - .col-sm-offset-6 { - margin-left: 50%; - } - .col-sm-offset-5 { - margin-left: 41.66666667%; - } - .col-sm-offset-4 { - margin-left: 33.33333333%; - } - .col-sm-offset-3 { - margin-left: 25%; - } - .col-sm-offset-2 { - margin-left: 16.66666667%; - } - .col-sm-offset-1 { - margin-left: 8.33333333%; - } - .col-sm-offset-0 { - margin-left: 0; - } -} -@media (min-width: 992px) { - .col-md-1, .col-md-2, .col-md-3, .col-md-4, .col-md-5, .col-md-6, .col-md-7, .col-md-8, .col-md-9, .col-md-10, .col-md-11, .col-md-12 { - float: left; - } - .col-md-12 { - width: 100%; - } - .col-md-11 { - width: 91.66666667%; - } - .col-md-10 { - width: 83.33333333%; - } - .col-md-9 { - width: 75%; - } - .col-md-8 { - width: 66.66666667%; - } - .col-md-7 { - width: 58.33333333%; - } - .col-md-6 { - width: 50%; - } - .col-md-5 { - width: 41.66666667%; - } - .col-md-4 { - width: 33.33333333%; - } - .col-md-3 { - width: 25%; - } - .col-md-2 { - width: 16.66666667%; - } - .col-md-1 { - width: 8.33333333%; - } - .col-md-pull-12 { - right: 100%; - } - .col-md-pull-11 { - right: 91.66666667%; - } - .col-md-pull-10 { - right: 83.33333333%; - } - .col-md-pull-9 { - right: 75%; - } - .col-md-pull-8 { - right: 66.66666667%; - } - .col-md-pull-7 { - right: 58.33333333%; - } - .col-md-pull-6 { - right: 50%; - } - .col-md-pull-5 { - right: 41.66666667%; - } - .col-md-pull-4 { - right: 33.33333333%; - } - .col-md-pull-3 { - right: 25%; - } - .col-md-pull-2 { - right: 16.66666667%; - } - .col-md-pull-1 { - right: 8.33333333%; - } - .col-md-pull-0 { - right: auto; - } - .col-md-push-12 { - left: 100%; - } - .col-md-push-11 { - left: 91.66666667%; - } - .col-md-push-10 { - left: 83.33333333%; - } - .col-md-push-9 { - left: 75%; - } - .col-md-push-8 { - left: 66.66666667%; - } - .col-md-push-7 { - left: 58.33333333%; - } - .col-md-push-6 { - left: 50%; - } - .col-md-push-5 { - left: 41.66666667%; - } - .col-md-push-4 { - left: 33.33333333%; - } - .col-md-push-3 { - left: 25%; - } - .col-md-push-2 { - left: 16.66666667%; - } - .col-md-push-1 { - left: 8.33333333%; - } - .col-md-push-0 { - left: auto; - } - .col-md-offset-12 { - margin-left: 100%; - } - .col-md-offset-11 { - margin-left: 91.66666667%; - } - .col-md-offset-10 { - margin-left: 83.33333333%; - } - .col-md-offset-9 { - margin-left: 75%; - } - .col-md-offset-8 { - margin-left: 66.66666667%; - } - .col-md-offset-7 { - margin-left: 58.33333333%; - } - .col-md-offset-6 { - margin-left: 50%; - } - .col-md-offset-5 { - margin-left: 41.66666667%; - } - .col-md-offset-4 { - margin-left: 33.33333333%; - } - .col-md-offset-3 { - margin-left: 25%; - } - .col-md-offset-2 { - margin-left: 16.66666667%; - } - .col-md-offset-1 { - margin-left: 8.33333333%; - } - .col-md-offset-0 { - margin-left: 0; - } -} -@media (min-width: 1200px) { - .col-lg-1, .col-lg-2, .col-lg-3, .col-lg-4, .col-lg-5, .col-lg-6, .col-lg-7, .col-lg-8, .col-lg-9, .col-lg-10, .col-lg-11, .col-lg-12 { - float: left; - } - .col-lg-12 { - width: 100%; - } - .col-lg-11 { - width: 91.66666667%; - } - .col-lg-10 { - width: 83.33333333%; - } - .col-lg-9 { - width: 75%; - } - .col-lg-8 { - width: 66.66666667%; - } - .col-lg-7 { - width: 58.33333333%; - } - .col-lg-6 { - width: 50%; - } - .col-lg-5 { - width: 41.66666667%; - } - .col-lg-4 { - width: 33.33333333%; - } - .col-lg-3 { - width: 25%; - } - .col-lg-2 { - width: 16.66666667%; - } - .col-lg-1 { - width: 8.33333333%; - } - .col-lg-pull-12 { - right: 100%; - } - .col-lg-pull-11 { - right: 91.66666667%; - } - .col-lg-pull-10 { - right: 83.33333333%; - } - .col-lg-pull-9 { - right: 75%; - } - .col-lg-pull-8 { - right: 66.66666667%; - } - .col-lg-pull-7 { - right: 58.33333333%; - } - .col-lg-pull-6 { - right: 50%; - } - .col-lg-pull-5 { - right: 41.66666667%; - } - .col-lg-pull-4 { - right: 33.33333333%; - } - .col-lg-pull-3 { - right: 25%; - } - .col-lg-pull-2 { - right: 16.66666667%; - } - .col-lg-pull-1 { - right: 8.33333333%; - } - .col-lg-pull-0 { - right: auto; - } - .col-lg-push-12 { - left: 100%; - } - .col-lg-push-11 { - left: 91.66666667%; - } - .col-lg-push-10 { - left: 83.33333333%; - } - .col-lg-push-9 { - left: 75%; - } - .col-lg-push-8 { - left: 66.66666667%; - } - .col-lg-push-7 { - left: 58.33333333%; - } - .col-lg-push-6 { - left: 50%; - } - .col-lg-push-5 { - left: 41.66666667%; - } - .col-lg-push-4 { - left: 33.33333333%; - } - .col-lg-push-3 { - left: 25%; - } - .col-lg-push-2 { - left: 16.66666667%; - } - .col-lg-push-1 { - left: 8.33333333%; - } - .col-lg-push-0 { - left: auto; - } - .col-lg-offset-12 { - margin-left: 100%; - } - .col-lg-offset-11 { - margin-left: 91.66666667%; - } - .col-lg-offset-10 { - margin-left: 83.33333333%; - } - .col-lg-offset-9 { - margin-left: 75%; - } - .col-lg-offset-8 { - margin-left: 66.66666667%; - } - .col-lg-offset-7 { - margin-left: 58.33333333%; - } - .col-lg-offset-6 { - margin-left: 50%; - } - .col-lg-offset-5 { - margin-left: 41.66666667%; - } - .col-lg-offset-4 { - margin-left: 33.33333333%; - } - .col-lg-offset-3 { - margin-left: 25%; - } - .col-lg-offset-2 { - margin-left: 16.66666667%; - } - .col-lg-offset-1 { - margin-left: 8.33333333%; - } - .col-lg-offset-0 { - margin-left: 0; - } -} -table { - background-color: transparent; -} -caption { - padding-top: 8px; - padding-bottom: 8px; - color: #777; - text-align: left; -} -th { -} -.table { - width: 100%; - max-width: 100%; - margin-bottom: 20px; -} -.table > thead > tr > th, -.table > tbody > tr > th, -.table > tfoot > tr > th, -.table > thead > tr > td, -.table > tbody > tr > td, -.table > tfoot > tr > td { - padding: 8px; - line-height: 1.42857143; - vertical-align: top; - border-top: 1px solid #ddd; -} -.table > thead > tr > th { - vertical-align: bottom; - border-bottom: 2px solid #ddd; -} -.table > caption + thead > tr:first-child > th, -.table > colgroup + thead > tr:first-child > th, -.table > thead:first-child > tr:first-child > th, -.table > caption + thead > tr:first-child > td, -.table > colgroup + thead > tr:first-child > td, -.table > thead:first-child > tr:first-child > td { - border-top: 0; -} -.table > tbody + tbody { - border-top: 2px solid #ddd; -} -.table .table { - background-color: #fff; -} -.table-condensed > thead > tr > th, -.table-condensed > tbody > tr > th, -.table-condensed > tfoot > tr > th, -.table-condensed > thead > tr > td, -.table-condensed > tbody > tr > td, -.table-condensed > tfoot > tr > td { - padding: 5px; -} -.table-bordered { - border: 1px solid #ddd; -} -.table-bordered > thead > tr > th, -.table-bordered > tbody > tr > th, -.table-bordered > tfoot > tr > th, -.table-bordered > thead > tr > td, -.table-bordered > tbody > tr > td, -.table-bordered > tfoot > tr > td { - border: 1px solid #ddd; -} -.table-bordered > thead > tr > th, -.table-bordered > thead > tr > td { - border-bottom-width: 2px; -} -.table-striped > tbody > tr:nth-child(odd) { - background-color: #f9f9f9; -} -.table-hover > tbody > tr:hover { - background-color: #f5f5f5; -} -table col[class*="col-"] { - position: static; - display: table-column; - float: none; -} -table td[class*="col-"], -table th[class*="col-"] { - position: static; - display: table-cell; - float: none; -} -.table > thead > tr > td.active, -.table > tbody > tr > td.active, -.table > tfoot > tr > td.active, -.table > thead > tr > th.active, -.table > tbody > tr > th.active, -.table > tfoot > tr > th.active, -.table > thead > tr.active > td, -.table > tbody > tr.active > td, -.table > tfoot > tr.active > td, -.table > thead > tr.active > th, -.table > tbody > tr.active > th, -.table > tfoot > tr.active > th { - background-color: #f5f5f5; -} -.table-hover > tbody > tr > td.active:hover, -.table-hover > tbody > tr > th.active:hover, -.table-hover > tbody > tr.active:hover > td, -.table-hover > tbody > tr:hover > .active, -.table-hover > tbody > tr.active:hover > th { - background-color: #e8e8e8; -} -.table > thead > tr > td.success, -.table > tbody > tr > td.success, -.table > tfoot > tr > td.success, -.table > thead > tr > th.success, -.table > tbody > tr > th.success, -.table > tfoot > tr > th.success, -.table > thead > tr.success > td, -.table > tbody > tr.success > td, -.table > tfoot > tr.success > td, -.table > thead > tr.success > th, -.table > tbody > tr.success > th, -.table > tfoot > tr.success > th { - background-color: #dff0d8; -} -.table-hover > tbody > tr > td.success:hover, -.table-hover > tbody > tr > th.success:hover, -.table-hover > tbody > tr.success:hover > td, -.table-hover > tbody > tr:hover > .success, -.table-hover > tbody > tr.success:hover > th { - background-color: #d0e9c6; -} -.table > thead > tr > td.info, -.table > tbody > tr > td.info, -.table > tfoot > tr > td.info, -.table > thead > tr > th.info, -.table > tbody > tr > th.info, -.table > tfoot > tr > th.info, -.table > thead > tr.info > td, -.table > tbody > tr.info > td, -.table > tfoot > tr.info > td, -.table > thead > tr.info > th, -.table > tbody > tr.info > th, -.table > tfoot > tr.info > th { - background-color: #d9edf7; -} -.table-hover > tbody > tr > td.info:hover, -.table-hover > tbody > tr > th.info:hover, -.table-hover > tbody > tr.info:hover > td, -.table-hover > tbody > tr:hover > .info, -.table-hover > tbody > tr.info:hover > th { - background-color: #c4e3f3; -} -.table > thead > tr > td.warning, -.table > tbody > tr > td.warning, -.table > tfoot > tr > td.warning, -.table > thead > tr > th.warning, -.table > tbody > tr > th.warning, -.table > tfoot > tr > th.warning, -.table > thead > tr.warning > td, -.table > tbody > tr.warning > td, -.table > tfoot > tr.warning > td, -.table > thead > tr.warning > th, -.table > tbody > tr.warning > th, -.table > tfoot > tr.warning > th { - background-color: #fcf8e3; -} -.table-hover > tbody > tr > td.warning:hover, -.table-hover > tbody > tr > th.warning:hover, -.table-hover > tbody > tr.warning:hover > td, -.table-hover > tbody > tr:hover > .warning, -.table-hover > tbody > tr.warning:hover > th { - background-color: #faf2cc; -} -.table > thead > tr > td.danger, -.table > tbody > tr > td.danger, -.table > tfoot > tr > td.danger, -.table > thead > tr > th.danger, -.table > tbody > tr > th.danger, -.table > tfoot > tr > th.danger, -.table > thead > tr.danger > td, -.table > tbody > tr.danger > td, -.table > tfoot > tr.danger > td, -.table > thead > tr.danger > th, -.table > tbody > tr.danger > th, -.table > tfoot > tr.danger > th { - background-color: #f2dede; -} -.table-hover > tbody > tr > td.danger:hover, -.table-hover > tbody > tr > th.danger:hover, -.table-hover > tbody > tr.danger:hover > td, -.table-hover > tbody > tr:hover > .danger, -.table-hover > tbody > tr.danger:hover > th { - background-color: #ebcccc; -} -.table-responsive { - min-height: .01%; - overflow-x: auto; -} -@media screen and (max-width: 767px) { - .table-responsive { - width: 100%; - margin-bottom: 15px; - overflow-y: hidden; - -ms-overflow-style: -ms-autohiding-scrollbar; - border: 1px solid #ddd; - } - .table-responsive > .table { - margin-bottom: 0; - } - .table-responsive > .table > thead > tr > th, - .table-responsive > .table > tbody > tr > th, - .table-responsive > .table > tfoot > tr > th, - .table-responsive > .table > thead > tr > td, - .table-responsive > .table > tbody > tr > td, - .table-responsive > .table > tfoot > tr > td { - white-space: nowrap; - } - .table-responsive > .table-bordered { - border: 0; - } - .table-responsive > .table-bordered > thead > tr > th:first-child, - .table-responsive > .table-bordered > tbody > tr > th:first-child, - .table-responsive > .table-bordered > tfoot > tr > th:first-child, - .table-responsive > .table-bordered > thead > tr > td:first-child, - .table-responsive > .table-bordered > tbody > tr > td:first-child, - .table-responsive > .table-bordered > tfoot > tr > td:first-child { - border-left: 0; - } - .table-responsive > .table-bordered > thead > tr > th:last-child, - .table-responsive > .table-bordered > tbody > tr > th:last-child, - .table-responsive > .table-bordered > tfoot > tr > th:last-child, - .table-responsive > .table-bordered > thead > tr > td:last-child, - .table-responsive > .table-bordered > tbody > tr > td:last-child, - .table-responsive > .table-bordered > tfoot > tr > td:last-child { - border-right: 0; - } - .table-responsive > .table-bordered > tbody > tr:last-child > th, - .table-responsive > .table-bordered > tfoot > tr:last-child > th, - .table-responsive > .table-bordered > tbody > tr:last-child > td, - .table-responsive > .table-bordered > tfoot > tr:last-child > td { - border-bottom: 0; - } -} -fieldset { - min-width: 0; - padding: 0; - margin: 0; - border: 0; -} -legend { - display: block; - width: 100%; - padding: 0; - margin-bottom: 20px; - font-size: 21px; - line-height: inherit; - color: #333; - border: 0; - border-bottom: 1px solid #e5e5e5; -} -label { - display: inline-block; - max-width: 100%; - margin-bottom: 5px; - font-weight: bold; -} -input[type="search"] { - -webkit-box-sizing: border-box; - -moz-box-sizing: border-box; - box-sizing: border-box; -} -input[type="radio"], -input[type="checkbox"] { - margin: 4px 0 0; - margin-top: 1px \9; - line-height: normal; -} -input[type="file"] { - display: block; -} -input[type="range"] { - display: block; - width: 100%; -} -select[multiple], -select[size] { - height: auto; -} -input[type="file"]:focus, -input[type="radio"]:focus, -input[type="checkbox"]:focus { - outline: thin dotted; - outline: 5px auto -webkit-focus-ring-color; - outline-offset: -2px; -} -output { - display: block; - padding-top: 7px; - font-size: 14px; - line-height: 1.42857143; - color: #555; -} -.form-control { - display: block; - width: 100%; - height: 34px; - padding: 6px 12px; - font-size: 14px; - line-height: 1.42857143; - color: #555; - background-color: #fff; - background-image: none; - border: 1px solid #ccc; - border-radius: 4px; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075); - -webkit-transition: border-color ease-in-out .15s, -webkit-box-shadow ease-in-out .15s; - -o-transition: border-color ease-in-out .15s, box-shadow ease-in-out .15s; - transition: border-color ease-in-out .15s, box-shadow ease-in-out .15s; -} -.form-control:focus { - border-color: #66afe9; - outline: 0; - -webkit-box-shadow: inset 0 1px 1px rgba(0,0,0,.075), 0 0 8px rgba(102, 175, 233, .6); - box-shadow: inset 0 1px 1px rgba(0,0,0,.075), 0 0 8px rgba(102, 175, 233, .6); -} -.form-control::-moz-placeholder { - color: #999; - opacity: 1; -} -.form-control:-ms-input-placeholder { - color: #999; -} -.form-control::-webkit-input-placeholder { - color: #999; -} -.form-control[disabled], -.form-control[readonly], -fieldset[disabled] .form-control { - cursor: not-allowed; - background-color: #eee; - opacity: 1; -} -textarea.form-control { - height: auto; -} -input[type="search"] { - -webkit-appearance: none; -} -@media screen and (-webkit-min-device-pixel-ratio: 0) { - input[type="date"], - input[type="time"], - input[type="datetime-local"], - input[type="month"] { - line-height: 34px; - } - input[type="date"].input-sm, - input[type="time"].input-sm, - input[type="datetime-local"].input-sm, - input[type="month"].input-sm { - line-height: 30px; - } - input[type="date"].input-lg, - input[type="time"].input-lg, - input[type="datetime-local"].input-lg, - input[type="month"].input-lg { - line-height: 46px; - } -} -.form-group { - margin-bottom: 15px; -} -.radio, -.checkbox { - position: relative; - display: block; - margin-top: 10px; - margin-bottom: 10px; -} -.radio label, -.checkbox label { - min-height: 20px; - padding-left: 20px; - margin-bottom: 0; - font-weight: normal; - cursor: pointer; -} -.radio input[type="radio"], -.radio-inline input[type="radio"], -.checkbox input[type="checkbox"], -.checkbox-inline input[type="checkbox"] { - position: absolute; - margin-top: 4px \9; - margin-left: -20px; -} -.radio + .radio, -.checkbox + .checkbox { - margin-top: -5px; -} -.radio-inline, -.checkbox-inline { - display: inline-block; - padding-left: 20px; - margin-bottom: 0; - font-weight: normal; - vertical-align: middle; - cursor: pointer; -} -.radio-inline + .radio-inline, -.checkbox-inline + .checkbox-inline { - margin-top: 0; - margin-left: 10px; -} -input[type="radio"][disabled], -input[type="checkbox"][disabled], -input[type="radio"].disabled, -input[type="checkbox"].disabled, -fieldset[disabled] input[type="radio"], -fieldset[disabled] input[type="checkbox"] { - cursor: not-allowed; -} -.radio-inline.disabled, -.checkbox-inline.disabled, -fieldset[disabled] .radio-inline, -fieldset[disabled] .checkbox-inline { - cursor: not-allowed; -} -.radio.disabled label, -.checkbox.disabled label, -fieldset[disabled] .radio label, -fieldset[disabled] .checkbox label { - cursor: not-allowed; -} -.form-control-static { - padding-top: 7px; - padding-bottom: 7px; - margin-bottom: 0; -} -.form-control-static.input-lg, -.form-control-static.input-sm { - padding-right: 0; - padding-left: 0; -} -.input-sm, -.form-group-sm .form-control { - height: 30px; - padding: 5px 10px; - font-size: 12px; - line-height: 1.5; - border-radius: 3px; -} -select.input-sm, -select.form-group-sm .form-control { - height: 30px; - line-height: 30px; -} -textarea.input-sm, -textarea.form-group-sm .form-control, -select[multiple].input-sm, -select[multiple].form-group-sm .form-control { - height: auto; -} -.input-lg, -.form-group-lg .form-control { - height: 46px; - padding: 10px 16px; - font-size: 18px; - line-height: 1.33; - border-radius: 6px; -} -select.input-lg, -select.form-group-lg .form-control { - height: 46px; - line-height: 46px; -} -textarea.input-lg, -textarea.form-group-lg .form-control, -select[multiple].input-lg, -select[multiple].form-group-lg .form-control { - height: auto; -} -.has-feedback { - position: relative; -} -.has-feedback .form-control { - padding-right: 42.5px; -} -.form-control-feedback { - position: absolute; - top: 0; - right: 0; - z-index: 2; - display: block; - width: 34px; - height: 34px; - line-height: 34px; - text-align: center; - pointer-events: none; -} -.input-lg + .form-control-feedback { - width: 46px; - height: 46px; - line-height: 46px; -} -.input-sm + .form-control-feedback { - width: 30px; - height: 30px; - line-height: 30px; -} -.has-success .help-block, -.has-success .control-label, -.has-success .radio, -.has-success .checkbox, -.has-success .radio-inline, -.has-success .checkbox-inline, -.has-success.radio label, -.has-success.checkbox label, -.has-success.radio-inline label, -.has-success.checkbox-inline label { - color: #3c763d; -} -.has-success .form-control { - border-color: #3c763d; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075); -} -.has-success .form-control:focus { - border-color: #2b542c; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075), 0 0 6px #67b168; - box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075), 0 0 6px #67b168; -} -.has-success .input-group-addon { - color: #3c763d; - background-color: #dff0d8; - border-color: #3c763d; -} -.has-success .form-control-feedback { - color: #3c763d; -} -.has-warning .help-block, -.has-warning .control-label, -.has-warning .radio, -.has-warning .checkbox, -.has-warning .radio-inline, -.has-warning .checkbox-inline, -.has-warning.radio label, -.has-warning.checkbox label, -.has-warning.radio-inline label, -.has-warning.checkbox-inline label { - color: #8a6d3b; -} -.has-warning .form-control { - border-color: #8a6d3b; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075); -} -.has-warning .form-control:focus { - border-color: #66512c; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075), 0 0 6px #c0a16b; - box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075), 0 0 6px #c0a16b; -} -.has-warning .input-group-addon { - color: #8a6d3b; - background-color: #fcf8e3; - border-color: #8a6d3b; -} -.has-warning .form-control-feedback { - color: #8a6d3b; -} -.has-error .help-block, -.has-error .control-label, -.has-error .radio, -.has-error .checkbox, -.has-error .radio-inline, -.has-error .checkbox-inline, -.has-error.radio label, -.has-error.checkbox label, -.has-error.radio-inline label, -.has-error.checkbox-inline label { - color: #a94442; -} -.has-error .form-control { - border-color: #a94442; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075); -} -.has-error .form-control:focus { - border-color: #843534; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075), 0 0 6px #ce8483; - box-shadow: inset 0 1px 1px rgba(0, 0, 0, .075), 0 0 6px #ce8483; -} -.has-error .input-group-addon { - color: #a94442; - background-color: #f2dede; - border-color: #a94442; -} -.has-error .form-control-feedback { - color: #a94442; -} -.has-feedback label ~ .form-control-feedback { - top: 25px; -} -.has-feedback label.sr-only ~ .form-control-feedback { - top: 0; -} -.help-block { - display: block; - margin-top: 5px; - margin-bottom: 10px; - color: #737373; -} -@media (min-width: 768px) { - .form-inline .form-group { - display: inline-block; - margin-bottom: 0; - vertical-align: middle; - } - .form-inline .form-control { - display: inline-block; - width: auto; - vertical-align: middle; - } - .form-inline .form-control-static { - display: inline-block; - } - .form-inline .input-group { - display: inline-table; - vertical-align: middle; - } - .form-inline .input-group .input-group-addon, - .form-inline .input-group .input-group-btn, - .form-inline .input-group .form-control { - width: auto; - } - .form-inline .input-group > .form-control { - width: 100%; - } - .form-inline .control-label { - margin-bottom: 0; - vertical-align: middle; - } - .form-inline .radio, - .form-inline .checkbox { - display: inline-block; - margin-top: 0; - margin-bottom: 0; - vertical-align: middle; - } - .form-inline .radio label, - .form-inline .checkbox label { - padding-left: 0; - } - .form-inline .radio input[type="radio"], - .form-inline .checkbox input[type="checkbox"] { - position: relative; - margin-left: 0; - } - .form-inline .has-feedback .form-control-feedback { - top: 0; - } -} -.form-horizontal .radio, -.form-horizontal .checkbox, -.form-horizontal .radio-inline, -.form-horizontal .checkbox-inline { - padding-top: 7px; - margin-top: 0; - margin-bottom: 0; -} -.form-horizontal .radio, -.form-horizontal .checkbox { - min-height: 27px; -} -.form-horizontal .form-group { - margin-right: -15px; - margin-left: -15px; -} -@media (min-width: 768px) { - .form-horizontal .control-label { - padding-top: 7px; - margin-bottom: 0; - text-align: right; - } -} -.form-horizontal .has-feedback .form-control-feedback { - right: 15px; -} -@media (min-width: 768px) { - .form-horizontal .form-group-lg .control-label { - padding-top: 14.3px; - } -} -@media (min-width: 768px) { - .form-horizontal .form-group-sm .control-label { - padding-top: 6px; - } -} -.btn { - display: inline-block; - padding: 6px 12px; - margin-bottom: 0; - font-size: 14px; - font-weight: normal; - line-height: 1.42857143; - text-align: center; - white-space: nowrap; - vertical-align: middle; - -ms-touch-action: manipulation; - touch-action: manipulation; - cursor: pointer; - -webkit-user-select: none; - -moz-user-select: none; - -ms-user-select: none; - user-select: none; - background-image: none; - border: 1px solid transparent; - border-radius: 4px; -} -.btn:focus, -.btn:active:focus, -.btn.active:focus, -.btn.focus, -.btn:active.focus, -.btn.active.focus { - outline: thin dotted; - outline: 5px auto -webkit-focus-ring-color; - outline-offset: -2px; -} -.btn:hover, -.btn:focus, -.btn.focus { - color: #333; - text-decoration: none; -} -.btn:active, -.btn.active { - background-image: none; - outline: 0; - -webkit-box-shadow: inset 0 3px 5px rgba(0, 0, 0, .125); - box-shadow: inset 0 3px 5px rgba(0, 0, 0, .125); -} -.btn.disabled, -.btn[disabled], -fieldset[disabled] .btn { - pointer-events: none; - cursor: not-allowed; - filter: alpha(opacity=65); - -webkit-box-shadow: none; - box-shadow: none; - opacity: .65; -} -.btn-default { - color: #333; - background-color: #fff; - border-color: #ccc; -} -.btn-default:hover, -.btn-default:focus, -.btn-default.focus, -.btn-default:active, -.btn-default.active, -.open > .dropdown-toggle.btn-default { - color: #333; - background-color: #e6e6e6; - border-color: #adadad; -} -.btn-default:active, -.btn-default.active, -.open > .dropdown-toggle.btn-default { - background-image: none; -} -.btn-default.disabled, -.btn-default[disabled], -fieldset[disabled] .btn-default, -.btn-default.disabled:hover, -.btn-default[disabled]:hover, -fieldset[disabled] .btn-default:hover, -.btn-default.disabled:focus, -.btn-default[disabled]:focus, -fieldset[disabled] .btn-default:focus, -.btn-default.disabled.focus, -.btn-default[disabled].focus, -fieldset[disabled] .btn-default.focus, -.btn-default.disabled:active, -.btn-default[disabled]:active, -fieldset[disabled] .btn-default:active, -.btn-default.disabled.active, -.btn-default[disabled].active, -fieldset[disabled] .btn-default.active { - background-color: #fff; - border-color: #ccc; -} -.btn-default .badge { - color: #fff; - background-color: #333; -} -.btn-primary { - color: #fff; - background-color: #337ab7; - border-color: #2e6da4; -} -.btn-primary:hover, -.btn-primary:focus, -.btn-primary.focus, -.btn-primary:active, -.btn-primary.active, -.open > .dropdown-toggle.btn-primary { - color: #fff; - background-color: #286090; - border-color: #204d74; -} -.btn-primary:active, -.btn-primary.active, -.open > .dropdown-toggle.btn-primary { - background-image: none; -} -.btn-primary.disabled, -.btn-primary[disabled], -fieldset[disabled] .btn-primary, -.btn-primary.disabled:hover, -.btn-primary[disabled]:hover, -fieldset[disabled] .btn-primary:hover, -.btn-primary.disabled:focus, -.btn-primary[disabled]:focus, -fieldset[disabled] .btn-primary:focus, -.btn-primary.disabled.focus, -.btn-primary[disabled].focus, -fieldset[disabled] .btn-primary.focus, -.btn-primary.disabled:active, -.btn-primary[disabled]:active, -fieldset[disabled] .btn-primary:active, -.btn-primary.disabled.active, -.btn-primary[disabled].active, -fieldset[disabled] .btn-primary.active { - background-color: #337ab7; - border-color: #2e6da4; -} -.btn-primary .badge { - color: #337ab7; - background-color: #fff; -} -.btn-success { - color: #fff; - background-color: #5cb85c; - border-color: #4cae4c; -} -.btn-success:hover, -.btn-success:focus, -.btn-success.focus, -.btn-success:active, -.btn-success.active, -.open > .dropdown-toggle.btn-success { - color: #fff; - background-color: #449d44; - border-color: #398439; -} -.btn-success:active, -.btn-success.active, -.open > .dropdown-toggle.btn-success { - background-image: none; -} -.btn-success.disabled, -.btn-success[disabled], -fieldset[disabled] .btn-success, -.btn-success.disabled:hover, -.btn-success[disabled]:hover, -fieldset[disabled] .btn-success:hover, -.btn-success.disabled:focus, -.btn-success[disabled]:focus, -fieldset[disabled] .btn-success:focus, -.btn-success.disabled.focus, -.btn-success[disabled].focus, -fieldset[disabled] .btn-success.focus, -.btn-success.disabled:active, -.btn-success[disabled]:active, -fieldset[disabled] .btn-success:active, -.btn-success.disabled.active, -.btn-success[disabled].active, -fieldset[disabled] .btn-success.active { - background-color: #5cb85c; - border-color: #4cae4c; -} -.btn-success .badge { - color: #5cb85c; - background-color: #fff; -} -.btn-info { - color: #fff; - background-color: #5bc0de; - border-color: #46b8da; -} -.btn-info:hover, -.btn-info:focus, -.btn-info.focus, -.btn-info:active, -.btn-info.active, -.open > .dropdown-toggle.btn-info { - color: #fff; - background-color: #31b0d5; - border-color: #269abc; -} -.btn-info:active, -.btn-info.active, -.open > .dropdown-toggle.btn-info { - background-image: none; -} -.btn-info.disabled, -.btn-info[disabled], -fieldset[disabled] .btn-info, -.btn-info.disabled:hover, -.btn-info[disabled]:hover, -fieldset[disabled] .btn-info:hover, -.btn-info.disabled:focus, -.btn-info[disabled]:focus, -fieldset[disabled] .btn-info:focus, -.btn-info.disabled.focus, -.btn-info[disabled].focus, -fieldset[disabled] .btn-info.focus, -.btn-info.disabled:active, -.btn-info[disabled]:active, -fieldset[disabled] .btn-info:active, -.btn-info.disabled.active, -.btn-info[disabled].active, -fieldset[disabled] .btn-info.active { - background-color: #5bc0de; - border-color: #46b8da; -} -.btn-info .badge { - color: #5bc0de; - background-color: #fff; -} -.btn-warning { - color: #fff; - background-color: #f0ad4e; - border-color: #eea236; -} -.btn-warning:hover, -.btn-warning:focus, -.btn-warning.focus, -.btn-warning:active, -.btn-warning.active, -.open > .dropdown-toggle.btn-warning { - color: #fff; - background-color: #ec971f; - border-color: #d58512; -} -.btn-warning:active, -.btn-warning.active, -.open > .dropdown-toggle.btn-warning { - background-image: none; -} -.btn-warning.disabled, -.btn-warning[disabled], -fieldset[disabled] .btn-warning, -.btn-warning.disabled:hover, -.btn-warning[disabled]:hover, -fieldset[disabled] .btn-warning:hover, -.btn-warning.disabled:focus, -.btn-warning[disabled]:focus, -fieldset[disabled] .btn-warning:focus, -.btn-warning.disabled.focus, -.btn-warning[disabled].focus, -fieldset[disabled] .btn-warning.focus, -.btn-warning.disabled:active, -.btn-warning[disabled]:active, -fieldset[disabled] .btn-warning:active, -.btn-warning.disabled.active, -.btn-warning[disabled].active, -fieldset[disabled] .btn-warning.active { - background-color: #f0ad4e; - border-color: #eea236; -} -.btn-warning .badge { - color: #f0ad4e; - background-color: #fff; -} -.btn-danger { - color: #fff; - background-color: #d9534f; - border-color: #d43f3a; -} -.btn-danger:hover, -.btn-danger:focus, -.btn-danger.focus, -.btn-danger:active, -.btn-danger.active, -.open > .dropdown-toggle.btn-danger { - color: #fff; - background-color: #c9302c; - border-color: #ac2925; -} -.btn-danger:active, -.btn-danger.active, -.open > .dropdown-toggle.btn-danger { - background-image: none; -} -.btn-danger.disabled, -.btn-danger[disabled], -fieldset[disabled] .btn-danger, -.btn-danger.disabled:hover, -.btn-danger[disabled]:hover, -fieldset[disabled] .btn-danger:hover, -.btn-danger.disabled:focus, -.btn-danger[disabled]:focus, -fieldset[disabled] .btn-danger:focus, -.btn-danger.disabled.focus, -.btn-danger[disabled].focus, -fieldset[disabled] .btn-danger.focus, -.btn-danger.disabled:active, -.btn-danger[disabled]:active, -fieldset[disabled] .btn-danger:active, -.btn-danger.disabled.active, -.btn-danger[disabled].active, -fieldset[disabled] .btn-danger.active { - background-color: #d9534f; - border-color: #d43f3a; -} -.btn-danger .badge { - color: #d9534f; - background-color: #fff; -} -.btn-link { - font-weight: normal; - color: #337ab7; - border-radius: 0; -} -.btn-link, -.btn-link:active, -.btn-link.active, -.btn-link[disabled], -fieldset[disabled] .btn-link { - background-color: transparent; - -webkit-box-shadow: none; - box-shadow: none; -} -.btn-link, -.btn-link:hover, -.btn-link:focus, -.btn-link:active { - border-color: transparent; -} -.btn-link:hover, -.btn-link:focus { - color: #23527c; - text-decoration: underline; - background-color: transparent; -} -.btn-link[disabled]:hover, -fieldset[disabled] .btn-link:hover, -.btn-link[disabled]:focus, -fieldset[disabled] .btn-link:focus { - color: #777; - text-decoration: none; -} -.btn-lg, -.btn-group-lg > .btn { - padding: 10px 16px; - font-size: 18px; - line-height: 1.33; - border-radius: 6px; -} -.btn-sm, -.btn-group-sm > .btn { - padding: 5px 10px; - font-size: 12px; - line-height: 1.5; - border-radius: 3px; -} -.btn-xs, -.btn-group-xs > .btn { - padding: 1px 5px; - font-size: 12px; - line-height: 1.5; - border-radius: 3px; -} -.btn-block { - display: block; - width: 100%; -} -.btn-block + .btn-block { - margin-top: 5px; -} -input[type="submit"].btn-block, -input[type="reset"].btn-block, -input[type="button"].btn-block { - width: 100%; -} -.fade { - opacity: 0; - -webkit-transition: opacity .15s linear; - -o-transition: opacity .15s linear; - transition: opacity .15s linear; -} -.fade.in { - opacity: 1; -} -.collapse { - display: none; - visibility: hidden; -} -.collapse.in { - display: block; - visibility: visible; -} -tr.collapse.in { - display: table-row; -} -tbody.collapse.in { - display: table-row-group; -} -.collapsing { - position: relative; - height: 0; - overflow: hidden; - -webkit-transition-timing-function: ease; - -o-transition-timing-function: ease; - transition-timing-function: ease; - -webkit-transition-duration: .35s; - -o-transition-duration: .35s; - transition-duration: .35s; - -webkit-transition-property: height, visibility; - -o-transition-property: height, visibility; - transition-property: height, visibility; -} -.caret { - display: inline-block; - width: 0; - height: 0; - margin-left: 2px; - vertical-align: middle; - border-top: 4px solid; - border-right: 4px solid transparent; - border-left: 4px solid transparent; -} -.dropdown { - position: relative; -} -.dropdown-toggle:focus { - outline: 0; -} -.dropdown-menu { - position: absolute; - top: 100%; - left: 0; - z-index: 1000; - display: none; - float: left; - min-width: 160px; - padding: 5px 0; - margin: 2px 0 0; - font-size: 14px; - text-align: left; - list-style: none; - background-color: #fff; - -webkit-background-clip: padding-box; - background-clip: padding-box; - border: 1px solid #ccc; - border: 1px solid rgba(0, 0, 0, .15); - border-radius: 4px; - -webkit-box-shadow: 0 6px 12px rgba(0, 0, 0, .175); - box-shadow: 0 6px 12px rgba(0, 0, 0, .175); -} -.dropdown-menu.pull-right { - right: 0; - left: auto; -} -.dropdown-menu .divider { - height: 1px; - margin: 9px 0; - overflow: hidden; - background-color: #e5e5e5; -} -.dropdown-menu > li > a { - display: block; - padding: 3px 20px; - clear: both; - font-weight: normal; - line-height: 1.42857143; - color: #333; - white-space: nowrap; -} -.dropdown-menu > li > a:hover, -.dropdown-menu > li > a:focus { - color: #262626; - text-decoration: none; - background-color: #f5f5f5; -} -.dropdown-menu > .active > a, -.dropdown-menu > .active > a:hover, -.dropdown-menu > .active > a:focus { - color: #fff; - text-decoration: none; - background-color: #337ab7; - outline: 0; -} -.dropdown-menu > .disabled > a, -.dropdown-menu > .disabled > a:hover, -.dropdown-menu > .disabled > a:focus { - color: #777; -} -.dropdown-menu > .disabled > a:hover, -.dropdown-menu > .disabled > a:focus { - text-decoration: none; - cursor: not-allowed; - background-color: transparent; - background-image: none; - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); -} -.open > .dropdown-menu { - display: block; -} -.open > a { - outline: 0; -} -.dropdown-menu-right { - right: 0; - left: auto; -} -.dropdown-menu-left { - right: auto; - left: 0; -} -.dropdown-header { - display: block; - padding: 3px 20px; - font-size: 12px; - line-height: 1.42857143; - color: #777; - white-space: nowrap; -} -.dropdown-backdrop { - position: fixed; - top: 0; - right: 0; - bottom: 0; - left: 0; - z-index: 990; -} -.pull-right > .dropdown-menu { - right: 0; - left: auto; -} -.dropup .caret, -.navbar-fixed-bottom .dropdown .caret { - content: ""; - border-top: 0; - border-bottom: 4px solid; -} -.dropup .dropdown-menu, -.navbar-fixed-bottom .dropdown .dropdown-menu { - top: auto; - bottom: 100%; - margin-bottom: 1px; -} -@media (min-width: 768px) { - .navbar-right .dropdown-menu { - right: 0; - left: auto; - } - .navbar-right .dropdown-menu-left { - right: auto; - left: 0; - } -} -.btn-group, -.btn-group-vertical { - position: relative; - display: inline-block; - vertical-align: middle; -} -.btn-group > .btn, -.btn-group-vertical > .btn { - position: relative; - float: left; -} -.btn-group > .btn:hover, -.btn-group-vertical > .btn:hover, -.btn-group > .btn:focus, -.btn-group-vertical > .btn:focus, -.btn-group > .btn:active, -.btn-group-vertical > .btn:active, -.btn-group > .btn.active, -.btn-group-vertical > .btn.active { - z-index: 2; -} -.btn-group .btn + .btn, -.btn-group .btn + .btn-group, -.btn-group .btn-group + .btn, -.btn-group .btn-group + .btn-group { - margin-left: -1px; -} -.btn-toolbar { - margin-left: -5px; -} -.btn-toolbar .btn-group, -.btn-toolbar .input-group { - float: left; -} -.btn-toolbar > .btn, -.btn-toolbar > .btn-group, -.btn-toolbar > .input-group { - margin-left: 5px; -} -.btn-group > .btn:not(:first-child):not(:last-child):not(.dropdown-toggle) { - border-radius: 0; -} -.btn-group > .btn:first-child { - margin-left: 0; -} -.btn-group > .btn:first-child:not(:last-child):not(.dropdown-toggle) { - border-top-right-radius: 0; - border-bottom-right-radius: 0; -} -.btn-group > .btn:last-child:not(:first-child), -.btn-group > .dropdown-toggle:not(:first-child) { - border-top-left-radius: 0; - border-bottom-left-radius: 0; -} -.btn-group > .btn-group { - float: left; -} -.btn-group > .btn-group:not(:first-child):not(:last-child) > .btn { - border-radius: 0; -} -.btn-group > .btn-group:first-child > .btn:last-child, -.btn-group > .btn-group:first-child > .dropdown-toggle { - border-top-right-radius: 0; - border-bottom-right-radius: 0; -} -.btn-group > .btn-group:last-child > .btn:first-child { - border-top-left-radius: 0; - border-bottom-left-radius: 0; -} -.btn-group .dropdown-toggle:active, -.btn-group.open .dropdown-toggle { - outline: 0; -} -.btn-group > .btn + .dropdown-toggle { - padding-right: 8px; - padding-left: 8px; -} -.btn-group > .btn-lg + .dropdown-toggle { - padding-right: 12px; - padding-left: 12px; -} -.btn-group.open .dropdown-toggle { - -webkit-box-shadow: inset 0 3px 5px rgba(0, 0, 0, .125); - box-shadow: inset 0 3px 5px rgba(0, 0, 0, .125); -} -.btn-group.open .dropdown-toggle.btn-link { - -webkit-box-shadow: none; - box-shadow: none; -} -.btn .caret { - margin-left: 0; -} -.btn-lg .caret { - border-width: 5px 5px 0; - border-bottom-width: 0; -} -.dropup .btn-lg .caret { - border-width: 0 5px 5px; -} -.btn-group-vertical > .btn, -.btn-group-vertical > .btn-group, -.btn-group-vertical > .btn-group > .btn { - display: block; - float: none; - width: 100%; - max-width: 100%; -} -.btn-group-vertical > .btn-group > .btn { - float: none; -} -.btn-group-vertical > .btn + .btn, -.btn-group-vertical > .btn + .btn-group, -.btn-group-vertical > .btn-group + .btn, -.btn-group-vertical > .btn-group + .btn-group { - margin-top: -1px; - margin-left: 0; -} -.btn-group-vertical > .btn:not(:first-child):not(:last-child) { - border-radius: 0; -} -.btn-group-vertical > .btn:first-child:not(:last-child) { - border-top-right-radius: 4px; - border-bottom-right-radius: 0; - border-bottom-left-radius: 0; -} -.btn-group-vertical > .btn:last-child:not(:first-child) { - border-top-left-radius: 0; - border-top-right-radius: 0; - border-bottom-left-radius: 4px; -} -.btn-group-vertical > .btn-group:not(:first-child):not(:last-child) > .btn { - border-radius: 0; -} -.btn-group-vertical > .btn-group:first-child:not(:last-child) > .btn:last-child, -.btn-group-vertical > .btn-group:first-child:not(:last-child) > .dropdown-toggle { - border-bottom-right-radius: 0; - border-bottom-left-radius: 0; -} -.btn-group-vertical > .btn-group:last-child:not(:first-child) > .btn:first-child { - border-top-left-radius: 0; - border-top-right-radius: 0; -} -.btn-group-justified { - display: table; - width: 100%; - table-layout: fixed; - border-collapse: separate; -} -.btn-group-justified > .btn, -.btn-group-justified > .btn-group { - display: table-cell; - float: none; - width: 1%; -} -.btn-group-justified > .btn-group .btn { - width: 100%; -} -.btn-group-justified > .btn-group .dropdown-menu { - left: auto; -} -[data-toggle="buttons"] > .btn input[type="radio"], -[data-toggle="buttons"] > .btn-group > .btn input[type="radio"], -[data-toggle="buttons"] > .btn input[type="checkbox"], -[data-toggle="buttons"] > .btn-group > .btn input[type="checkbox"] { - position: absolute; - clip: rect(0, 0, 0, 0); - pointer-events: none; -} -.input-group { - position: relative; - display: table; - border-collapse: separate; -} -.input-group[class*="col-"] { - float: none; - padding-right: 0; - padding-left: 0; -} -.input-group .form-control { - position: relative; - z-index: 2; - float: left; - width: 100%; - margin-bottom: 0; -} -.input-group-lg > .form-control, -.input-group-lg > .input-group-addon, -.input-group-lg > .input-group-btn > .btn { - height: 46px; - padding: 10px 16px; - font-size: 18px; - line-height: 1.33; - border-radius: 6px; -} -select.input-group-lg > .form-control, -select.input-group-lg > .input-group-addon, -select.input-group-lg > .input-group-btn > .btn { - height: 46px; - line-height: 46px; -} -textarea.input-group-lg > .form-control, -textarea.input-group-lg > .input-group-addon, -textarea.input-group-lg > .input-group-btn > .btn, -select[multiple].input-group-lg > .form-control, -select[multiple].input-group-lg > .input-group-addon, -select[multiple].input-group-lg > .input-group-btn > .btn { - height: auto; -} -.input-group-sm > .form-control, -.input-group-sm > .input-group-addon, -.input-group-sm > .input-group-btn > .btn { - height: 30px; - padding: 5px 10px; - font-size: 12px; - line-height: 1.5; - border-radius: 3px; -} -select.input-group-sm > .form-control, -select.input-group-sm > .input-group-addon, -select.input-group-sm > .input-group-btn > .btn { - height: 30px; - line-height: 30px; -} -textarea.input-group-sm > .form-control, -textarea.input-group-sm > .input-group-addon, -textarea.input-group-sm > .input-group-btn > .btn, -select[multiple].input-group-sm > .form-control, -select[multiple].input-group-sm > .input-group-addon, -select[multiple].input-group-sm > .input-group-btn > .btn { - height: auto; -} -.input-group-addon, -.input-group-btn, -.input-group .form-control { - display: table-cell; -} -.input-group-addon:not(:first-child):not(:last-child), -.input-group-btn:not(:first-child):not(:last-child), -.input-group .form-control:not(:first-child):not(:last-child) { - border-radius: 0; -} -.input-group-addon, -.input-group-btn { - width: 1%; - white-space: nowrap; - vertical-align: middle; -} -.input-group-addon { - padding: 6px 12px; - font-size: 14px; - font-weight: normal; - line-height: 1; - color: #555; - text-align: center; - background-color: #eee; - border: 1px solid #ccc; - border-radius: 4px; -} -.input-group-addon.input-sm { - padding: 5px 10px; - font-size: 12px; - border-radius: 3px; -} -.input-group-addon.input-lg { - padding: 10px 16px; - font-size: 18px; - border-radius: 6px; -} -.input-group-addon input[type="radio"], -.input-group-addon input[type="checkbox"] { - margin-top: 0; -} -.input-group .form-control:first-child, -.input-group-addon:first-child, -.input-group-btn:first-child > .btn, -.input-group-btn:first-child > .btn-group > .btn, -.input-group-btn:first-child > .dropdown-toggle, -.input-group-btn:last-child > .btn:not(:last-child):not(.dropdown-toggle), -.input-group-btn:last-child > .btn-group:not(:last-child) > .btn { - border-top-right-radius: 0; - border-bottom-right-radius: 0; -} -.input-group-addon:first-child { - border-right: 0; -} -.input-group .form-control:last-child, -.input-group-addon:last-child, -.input-group-btn:last-child > .btn, -.input-group-btn:last-child > .btn-group > .btn, -.input-group-btn:last-child > .dropdown-toggle, -.input-group-btn:first-child > .btn:not(:first-child), -.input-group-btn:first-child > .btn-group:not(:first-child) > .btn { - border-top-left-radius: 0; - border-bottom-left-radius: 0; -} -.input-group-addon:last-child { - border-left: 0; -} -.input-group-btn { - position: relative; - font-size: 0; - white-space: nowrap; -} -.input-group-btn > .btn { - position: relative; -} -.input-group-btn > .btn + .btn { - margin-left: -1px; -} -.input-group-btn > .btn:hover, -.input-group-btn > .btn:focus, -.input-group-btn > .btn:active { - z-index: 2; -} -.input-group-btn:first-child > .btn, -.input-group-btn:first-child > .btn-group { - margin-right: -1px; -} -.input-group-btn:last-child > .btn, -.input-group-btn:last-child > .btn-group { - margin-left: -1px; -} -.nav { - padding-left: 0; - margin-bottom: 0; - list-style: none; -} -.nav > li { - position: relative; - display: block; -} -.nav > li > a { - position: relative; - display: block; - padding: 10px 15px; -} -.nav > li > a:hover, -.nav > li > a:focus { - text-decoration: none; - background-color: #eee; -} -.nav > li.disabled > a { - color: #777; -} -.nav > li.disabled > a:hover, -.nav > li.disabled > a:focus { - color: #777; - text-decoration: none; - cursor: not-allowed; - background-color: transparent; -} -.nav .open > a, -.nav .open > a:hover, -.nav .open > a:focus { - background-color: #eee; - border-color: #337ab7; -} -.nav .nav-divider { - height: 1px; - margin: 9px 0; - overflow: hidden; - background-color: #e5e5e5; -} -.nav > li > a > img { - max-width: none; -} -.nav-tabs { - border-bottom: 1px solid #ddd; -} -.nav-tabs > li { - float: left; - margin-bottom: -1px; -} -.nav-tabs > li > a { - margin-right: 2px; - line-height: 1.42857143; - border: 1px solid transparent; - border-radius: 4px 4px 0 0; -} -.nav-tabs > li > a:hover { - border-color: #eee #eee #ddd; -} -.nav-tabs > li.active > a, -.nav-tabs > li.active > a:hover, -.nav-tabs > li.active > a:focus { - color: #555; - cursor: default; - background-color: #fff; - border: 1px solid #ddd; - border-bottom-color: transparent; -} -.nav-tabs.nav-justified { - width: 100%; - border-bottom: 0; -} -.nav-tabs.nav-justified > li { - float: none; -} -.nav-tabs.nav-justified > li > a { - margin-bottom: 5px; - text-align: center; -} -.nav-tabs.nav-justified > .dropdown .dropdown-menu { - top: auto; - left: auto; -} -@media (min-width: 768px) { - .nav-tabs.nav-justified > li { - display: table-cell; - width: 1%; - } - .nav-tabs.nav-justified > li > a { - margin-bottom: 0; - } -} -.nav-tabs.nav-justified > li > a { - margin-right: 0; - border-radius: 4px; -} -.nav-tabs.nav-justified > .active > a, -.nav-tabs.nav-justified > .active > a:hover, -.nav-tabs.nav-justified > .active > a:focus { - border: 1px solid #ddd; -} -@media (min-width: 768px) { - .nav-tabs.nav-justified > li > a { - border-bottom: 1px solid #ddd; - border-radius: 4px 4px 0 0; - } - .nav-tabs.nav-justified > .active > a, - .nav-tabs.nav-justified > .active > a:hover, - .nav-tabs.nav-justified > .active > a:focus { - border-bottom-color: #fff; - } -} -.nav-pills > li { - float: left; -} -.nav-pills > li > a { - border-radius: 4px; -} -.nav-pills > li + li { - margin-left: 2px; -} -.nav-pills > li.active > a, -.nav-pills > li.active > a:hover, -.nav-pills > li.active > a:focus { - color: #fff; - background-color: #337ab7; -} -.nav-stacked > li { - float: none; -} -.nav-stacked > li + li { - margin-top: 2px; - margin-left: 0; -} -.nav-justified { - width: 100%; -} -.nav-justified > li { - float: none; -} -.nav-justified > li > a { - margin-bottom: 5px; - text-align: center; -} -.nav-justified > .dropdown .dropdown-menu { - top: auto; - left: auto; -} -@media (min-width: 768px) { - .nav-justified > li { - display: table-cell; - width: 1%; - } - .nav-justified > li > a { - margin-bottom: 0; - } -} -.nav-tabs-justified { - border-bottom: 0; -} -.nav-tabs-justified > li > a { - margin-right: 0; - border-radius: 4px; -} -.nav-tabs-justified > .active > a, -.nav-tabs-justified > .active > a:hover, -.nav-tabs-justified > .active > a:focus { - border: 1px solid #ddd; -} -@media (min-width: 768px) { - .nav-tabs-justified > li > a { - border-bottom: 1px solid #ddd; - border-radius: 4px 4px 0 0; - } - .nav-tabs-justified > .active > a, - .nav-tabs-justified > .active > a:hover, - .nav-tabs-justified > .active > a:focus { - border-bottom-color: #fff; - } -} -.tab-content > .tab-pane { - display: none; - visibility: hidden; -} -.tab-content > .active { - display: block; - visibility: visible; -} -.nav-tabs .dropdown-menu { - margin-top: -1px; - border-top-left-radius: 0; - border-top-right-radius: 0; -} -.navbar { - position: relative; - min-height: 50px; - margin-bottom: 20px; - border: 1px solid transparent; -} -@media (min-width: 768px) { - .navbar { - border-radius: 4px; - } -} -@media (min-width: 768px) { - .navbar-header { - float: left; - } -} -.navbar-collapse { - padding-right: 15px; - padding-left: 15px; - overflow-x: visible; - -webkit-overflow-scrolling: touch; - border-top: 1px solid transparent; - -webkit-box-shadow: inset 0 1px 0 rgba(255, 255, 255, .1); - box-shadow: inset 0 1px 0 rgba(255, 255, 255, .1); -} -.navbar-collapse.in { - overflow-y: auto; -} -@media (min-width: 768px) { - .navbar-collapse { - width: auto; - border-top: 0; - -webkit-box-shadow: none; - box-shadow: none; - } - .navbar-collapse.collapse { - display: block !important; - height: auto !important; - padding-bottom: 0; - overflow: visible !important; - visibility: visible !important; - } - .navbar-collapse.in { - overflow-y: visible; - } - .navbar-fixed-top .navbar-collapse, - .navbar-static-top .navbar-collapse, - .navbar-fixed-bottom .navbar-collapse { - padding-right: 0; - padding-left: 0; - } -} -.navbar-fixed-top .navbar-collapse, -.navbar-fixed-bottom .navbar-collapse { - max-height: 340px; -} -@media (max-device-width: 480px) and (orientation: landscape) { - .navbar-fixed-top .navbar-collapse, - .navbar-fixed-bottom .navbar-collapse { - max-height: 200px; - } -} -.container > .navbar-header, -.container-fluid > .navbar-header, -.container > .navbar-collapse, -.container-fluid > .navbar-collapse { - margin-right: -15px; - margin-left: -15px; -} -@media (min-width: 768px) { - .container > .navbar-header, - .container-fluid > .navbar-header, - .container > .navbar-collapse, - .container-fluid > .navbar-collapse { - margin-right: 0; - margin-left: 0; - } -} -.navbar-static-top { - z-index: 1000; - border-width: 0 0 1px; -} -@media (min-width: 768px) { - .navbar-static-top { - border-radius: 0; - } -} -.navbar-fixed-top, -.navbar-fixed-bottom { - position: fixed; - right: 0; - left: 0; - z-index: 1030; -} -@media (min-width: 768px) { - .navbar-fixed-top, - .navbar-fixed-bottom { - border-radius: 0; - } -} -.navbar-fixed-top { - top: 0; - border-width: 0 0 1px; -} -.navbar-fixed-bottom { - bottom: 0; - margin-bottom: 0; - border-width: 1px 0 0; -} -.navbar-brand { - float: left; - height: 50px; - padding: 15px 15px; - font-size: 18px; - line-height: 20px; -} -.navbar-brand:hover, -.navbar-brand:focus { - text-decoration: none; -} -.navbar-brand > img { - display: block; -} -@media (min-width: 768px) { - .navbar > .container .navbar-brand, - .navbar > .container-fluid .navbar-brand { - margin-left: -15px; - } -} -.navbar-toggle { - position: relative; - float: right; - padding: 9px 10px; - margin-top: 8px; - margin-right: 15px; - margin-bottom: 8px; - background-color: transparent; - background-image: none; - border: 1px solid transparent; - border-radius: 4px; -} -.navbar-toggle:focus { - outline: 0; -} -.navbar-toggle .icon-bar { - display: block; - width: 22px; - height: 2px; - border-radius: 1px; -} -.navbar-toggle .icon-bar + .icon-bar { - margin-top: 4px; -} -@media (min-width: 768px) { - .navbar-toggle { - display: none; - } -} -.navbar-nav { - margin: 7.5px -15px; -} -.navbar-nav > li > a { - padding-top: 10px; - padding-bottom: 10px; - line-height: 20px; -} -@media (max-width: 767px) { - .navbar-nav .open .dropdown-menu { - position: static; - float: none; - width: auto; - margin-top: 0; - background-color: transparent; - border: 0; - -webkit-box-shadow: none; - box-shadow: none; - } - .navbar-nav .open .dropdown-menu > li > a, - .navbar-nav .open .dropdown-menu .dropdown-header { - padding: 5px 15px 5px 25px; - } - .navbar-nav .open .dropdown-menu > li > a { - line-height: 20px; - } - .navbar-nav .open .dropdown-menu > li > a:hover, - .navbar-nav .open .dropdown-menu > li > a:focus { - background-image: none; - } -} -@media (min-width: 768px) { - .navbar-nav { - float: left; - margin: 0; - } - .navbar-nav > li { - float: left; - } - .navbar-nav > li > a { - padding-top: 15px; - padding-bottom: 15px; - } -} -.navbar-form { - padding: 10px 15px; - margin-top: 8px; - margin-right: -15px; - margin-bottom: 8px; - margin-left: -15px; - border-top: 1px solid transparent; - border-bottom: 1px solid transparent; - -webkit-box-shadow: inset 0 1px 0 rgba(255, 255, 255, .1), 0 1px 0 rgba(255, 255, 255, .1); - box-shadow: inset 0 1px 0 rgba(255, 255, 255, .1), 0 1px 0 rgba(255, 255, 255, .1); -} -@media (min-width: 768px) { - .navbar-form .form-group { - display: inline-block; - margin-bottom: 0; - vertical-align: middle; - } - .navbar-form .form-control { - display: inline-block; - width: auto; - vertical-align: middle; - } - .navbar-form .form-control-static { - display: inline-block; - } - .navbar-form .input-group { - display: inline-table; - vertical-align: middle; - } - .navbar-form .input-group .input-group-addon, - .navbar-form .input-group .input-group-btn, - .navbar-form .input-group .form-control { - width: auto; - } - .navbar-form .input-group > .form-control { - width: 100%; - } - .navbar-form .control-label { - margin-bottom: 0; - vertical-align: middle; - } - .navbar-form .radio, - .navbar-form .checkbox { - display: inline-block; - margin-top: 0; - margin-bottom: 0; - vertical-align: middle; - } - .navbar-form .radio label, - .navbar-form .checkbox label { - padding-left: 0; - } - .navbar-form .radio input[type="radio"], - .navbar-form .checkbox input[type="checkbox"] { - position: relative; - margin-left: 0; - } - .navbar-form .has-feedback .form-control-feedback { - top: 0; - } -} -@media (max-width: 767px) { - .navbar-form .form-group { - margin-bottom: 5px; - } - .navbar-form .form-group:last-child { - margin-bottom: 0; - } -} -@media (min-width: 768px) { - .navbar-form { - width: auto; - padding-top: 0; - padding-bottom: 0; - margin-right: 0; - margin-left: 0; - border: 0; - -webkit-box-shadow: none; - box-shadow: none; - } -} -.navbar-nav > li > .dropdown-menu { - margin-top: 0; - border-top-left-radius: 0; - border-top-right-radius: 0; -} -.navbar-fixed-bottom .navbar-nav > li > .dropdown-menu { - border-top-left-radius: 4px; - border-top-right-radius: 4px; - border-bottom-right-radius: 0; - border-bottom-left-radius: 0; -} -.navbar-btn { - margin-top: 8px; - margin-bottom: 8px; -} -.navbar-btn.btn-sm { - margin-top: 10px; - margin-bottom: 10px; -} -.navbar-btn.btn-xs { - margin-top: 14px; - margin-bottom: 14px; -} -.navbar-text { - margin-top: 15px; - margin-bottom: 15px; -} -@media (min-width: 768px) { - .navbar-text { - float: left; - margin-right: 15px; - margin-left: 15px; - } -} -@media (min-width: 768px) { - .navbar-left { - float: left !important; - } - .navbar-right { - float: right !important; - margin-right: -15px; - } - .navbar-right ~ .navbar-right { - margin-right: 0; - } -} -.navbar-default { - background-color: #f8f8f8; - border-color: #e7e7e7; -} -.navbar-default .navbar-brand { - color: #777; -} -.navbar-default .navbar-brand:hover, -.navbar-default .navbar-brand:focus { - color: #5e5e5e; - background-color: transparent; -} -.navbar-default .navbar-text { - color: #777; -} -.navbar-default .navbar-nav > li > a { - color: #777; -} -.navbar-default .navbar-nav > li > a:hover, -.navbar-default .navbar-nav > li > a:focus { - color: #333; - background-color: transparent; -} -.navbar-default .navbar-nav > .active > a, -.navbar-default .navbar-nav > .active > a:hover, -.navbar-default .navbar-nav > .active > a:focus { - color: #555; - background-color: #e7e7e7; -} -.navbar-default .navbar-nav > .disabled > a, -.navbar-default .navbar-nav > .disabled > a:hover, -.navbar-default .navbar-nav > .disabled > a:focus { - color: #ccc; - background-color: transparent; -} -.navbar-default .navbar-toggle { - border-color: #ddd; -} -.navbar-default .navbar-toggle:hover, -.navbar-default .navbar-toggle:focus { - background-color: #ddd; -} -.navbar-default .navbar-toggle .icon-bar { - background-color: #888; -} -.navbar-default .navbar-collapse, -.navbar-default .navbar-form { - border-color: #e7e7e7; -} -.navbar-default .navbar-nav > .open > a, -.navbar-default .navbar-nav > .open > a:hover, -.navbar-default .navbar-nav > .open > a:focus { - color: #555; - background-color: #e7e7e7; -} -@media (max-width: 767px) { - .navbar-default .navbar-nav .open .dropdown-menu > li > a { - color: #777; - } - .navbar-default .navbar-nav .open .dropdown-menu > li > a:hover, - .navbar-default .navbar-nav .open .dropdown-menu > li > a:focus { - color: #333; - background-color: transparent; - } - .navbar-default .navbar-nav .open .dropdown-menu > .active > a, - .navbar-default .navbar-nav .open .dropdown-menu > .active > a:hover, - .navbar-default .navbar-nav .open .dropdown-menu > .active > a:focus { - color: #555; - background-color: #e7e7e7; - } - .navbar-default .navbar-nav .open .dropdown-menu > .disabled > a, - .navbar-default .navbar-nav .open .dropdown-menu > .disabled > a:hover, - .navbar-default .navbar-nav .open .dropdown-menu > .disabled > a:focus { - color: #ccc; - background-color: transparent; - } -} -.navbar-default .navbar-link { - color: #777; -} -.navbar-default .navbar-link:hover { - color: #333; -} -.navbar-default .btn-link { - color: #777; -} -.navbar-default .btn-link:hover, -.navbar-default .btn-link:focus { - color: #333; -} -.navbar-default .btn-link[disabled]:hover, -fieldset[disabled] .navbar-default .btn-link:hover, -.navbar-default .btn-link[disabled]:focus, -fieldset[disabled] .navbar-default .btn-link:focus { - color: #ccc; -} -.navbar-inverse { - background-color: #222; - border-color: #080808; -} -.navbar-inverse .navbar-brand { - color: #9d9d9d; -} -.navbar-inverse .navbar-brand:hover, -.navbar-inverse .navbar-brand:focus { - color: #fff; - background-color: transparent; -} -.navbar-inverse .navbar-text { - color: #9d9d9d; -} -.navbar-inverse .navbar-nav > li > a { - color: #9d9d9d; -} -.navbar-inverse .navbar-nav > li > a:hover, -.navbar-inverse .navbar-nav > li > a:focus { - color: #fff; - background-color: transparent; -} -.navbar-inverse .navbar-nav > .active > a, -.navbar-inverse .navbar-nav > .active > a:hover, -.navbar-inverse .navbar-nav > .active > a:focus { - color: #fff; - background-color: #080808; -} -.navbar-inverse .navbar-nav > .disabled > a, -.navbar-inverse .navbar-nav > .disabled > a:hover, -.navbar-inverse .navbar-nav > .disabled > a:focus { - color: #444; - background-color: transparent; -} -.navbar-inverse .navbar-toggle { - border-color: #333; -} -.navbar-inverse .navbar-toggle:hover, -.navbar-inverse .navbar-toggle:focus { - background-color: #333; -} -.navbar-inverse .navbar-toggle .icon-bar { - background-color: #fff; -} -.navbar-inverse .navbar-collapse, -.navbar-inverse .navbar-form { - border-color: #101010; -} -.navbar-inverse .navbar-nav > .open > a, -.navbar-inverse .navbar-nav > .open > a:hover, -.navbar-inverse .navbar-nav > .open > a:focus { - color: #fff; - background-color: #080808; -} -@media (max-width: 767px) { - .navbar-inverse .navbar-nav .open .dropdown-menu > .dropdown-header { - border-color: #080808; - } - .navbar-inverse .navbar-nav .open .dropdown-menu .divider { - background-color: #080808; - } - .navbar-inverse .navbar-nav .open .dropdown-menu > li > a { - color: #9d9d9d; - } - .navbar-inverse .navbar-nav .open .dropdown-menu > li > a:hover, - .navbar-inverse .navbar-nav .open .dropdown-menu > li > a:focus { - color: #fff; - background-color: transparent; - } - .navbar-inverse .navbar-nav .open .dropdown-menu > .active > a, - .navbar-inverse .navbar-nav .open .dropdown-menu > .active > a:hover, - .navbar-inverse .navbar-nav .open .dropdown-menu > .active > a:focus { - color: #fff; - background-color: #080808; - } - .navbar-inverse .navbar-nav .open .dropdown-menu > .disabled > a, - .navbar-inverse .navbar-nav .open .dropdown-menu > .disabled > a:hover, - .navbar-inverse .navbar-nav .open .dropdown-menu > .disabled > a:focus { - color: #444; - background-color: transparent; - } -} -.navbar-inverse .navbar-link { - color: #9d9d9d; -} -.navbar-inverse .navbar-link:hover { - color: #fff; -} -.navbar-inverse .btn-link { - color: #9d9d9d; -} -.navbar-inverse .btn-link:hover, -.navbar-inverse .btn-link:focus { - color: #fff; -} -.navbar-inverse .btn-link[disabled]:hover, -fieldset[disabled] .navbar-inverse .btn-link:hover, -.navbar-inverse .btn-link[disabled]:focus, -fieldset[disabled] .navbar-inverse .btn-link:focus { - color: #444; -} -.breadcrumb { - padding: 8px 15px; - margin-bottom: 20px; - list-style: none; - background-color: #f5f5f5; - border-radius: 4px; -} -.breadcrumb > li { - display: inline-block; -} -.breadcrumb > li + li:before { - padding: 0 5px; - color: #ccc; - content: "/\00a0"; -} -.breadcrumb > .active { - color: #777; -} -.pagination { - display: inline-block; - padding-left: 0; - margin: 20px 0; - border-radius: 4px; -} -.pagination > li { - display: inline; -} -.pagination > li > a, -.pagination > li > span { - position: relative; - float: left; - padding: 6px 12px; - margin-left: -1px; - line-height: 1.42857143; - color: #337ab7; - text-decoration: none; - background-color: #fff; - border: 1px solid #ddd; -} -.pagination > li:first-child > a, -.pagination > li:first-child > span { - margin-left: 0; - border-top-left-radius: 4px; - border-bottom-left-radius: 4px; -} -.pagination > li:last-child > a, -.pagination > li:last-child > span { - border-top-right-radius: 4px; - border-bottom-right-radius: 4px; -} -.pagination > li > a:hover, -.pagination > li > span:hover, -.pagination > li > a:focus, -.pagination > li > span:focus { - color: #23527c; - background-color: #eee; - border-color: #ddd; -} -.pagination > .active > a, -.pagination > .active > span, -.pagination > .active > a:hover, -.pagination > .active > span:hover, -.pagination > .active > a:focus, -.pagination > .active > span:focus { - z-index: 2; - color: #fff; - cursor: default; - background-color: #337ab7; - border-color: #337ab7; -} -.pagination > .disabled > span, -.pagination > .disabled > span:hover, -.pagination > .disabled > span:focus, -.pagination > .disabled > a, -.pagination > .disabled > a:hover, -.pagination > .disabled > a:focus { - color: #777; - cursor: not-allowed; - background-color: #fff; - border-color: #ddd; -} -.pagination-lg > li > a, -.pagination-lg > li > span { - padding: 10px 16px; - font-size: 18px; -} -.pagination-lg > li:first-child > a, -.pagination-lg > li:first-child > span { - border-top-left-radius: 6px; - border-bottom-left-radius: 6px; -} -.pagination-lg > li:last-child > a, -.pagination-lg > li:last-child > span { - border-top-right-radius: 6px; - border-bottom-right-radius: 6px; -} -.pagination-sm > li > a, -.pagination-sm > li > span { - padding: 5px 10px; - font-size: 12px; -} -.pagination-sm > li:first-child > a, -.pagination-sm > li:first-child > span { - border-top-left-radius: 3px; - border-bottom-left-radius: 3px; -} -.pagination-sm > li:last-child > a, -.pagination-sm > li:last-child > span { - border-top-right-radius: 3px; - border-bottom-right-radius: 3px; -} -.pager { - padding-left: 0; - margin: 20px 0; - text-align: center; - list-style: none; -} -.pager li { - display: inline; -} -.pager li > a, -.pager li > span { - display: inline-block; - padding: 5px 14px; - background-color: #fff; - border: 1px solid #ddd; - border-radius: 15px; -} -.pager li > a:hover, -.pager li > a:focus { - text-decoration: none; - background-color: #eee; -} -.pager .next > a, -.pager .next > span { - float: right; -} -.pager .previous > a, -.pager .previous > span { - float: left; -} -.pager .disabled > a, -.pager .disabled > a:hover, -.pager .disabled > a:focus, -.pager .disabled > span { - color: #777; - cursor: not-allowed; - background-color: #fff; -} -.label { - display: inline; - padding: .2em .6em .3em; - font-size: 75%; - font-weight: bold; - line-height: 1; - color: #fff; - text-align: center; - white-space: nowrap; - vertical-align: baseline; - border-radius: .25em; -} -a.label:hover, -a.label:focus { - color: #fff; - text-decoration: none; - cursor: pointer; -} -.label:empty { - display: none; -} -.btn .label { - position: relative; - top: -1px; -} -.label-default { - background-color: #777; -} -.label-default[href]:hover, -.label-default[href]:focus { - background-color: #5e5e5e; -} -.label-primary { - background-color: #337ab7; -} -.label-primary[href]:hover, -.label-primary[href]:focus { - background-color: #286090; -} -.label-success { - background-color: #5cb85c; -} -.label-success[href]:hover, -.label-success[href]:focus { - background-color: #449d44; -} -.label-info { - background-color: #5bc0de; -} -.label-info[href]:hover, -.label-info[href]:focus { - background-color: #31b0d5; -} -.label-warning { - background-color: #f0ad4e; -} -.label-warning[href]:hover, -.label-warning[href]:focus { - background-color: #ec971f; -} -.label-danger { - background-color: #d9534f; -} -.label-danger[href]:hover, -.label-danger[href]:focus { - background-color: #c9302c; -} -.badge { - display: inline-block; - min-width: 10px; - padding: 3px 7px; - font-size: 12px; - font-weight: bold; - line-height: 1; - color: #fff; - text-align: center; - white-space: nowrap; - vertical-align: baseline; - background-color: #777; - border-radius: 10px; -} -.badge:empty { - display: none; -} -.btn .badge { - position: relative; - top: -1px; -} -.btn-xs .badge { - top: 0; - padding: 1px 5px; -} -a.badge:hover, -a.badge:focus { - color: #fff; - text-decoration: none; - cursor: pointer; -} -.list-group-item.active > .badge, -.nav-pills > .active > a > .badge { - color: #337ab7; - background-color: #fff; -} -.list-group-item > .badge { - float: right; -} -.list-group-item > .badge + .badge { - margin-right: 5px; -} -.nav-pills > li > a > .badge { - margin-left: 3px; -} -.jumbotron { - padding: 30px 15px; - margin-bottom: 30px; - color: inherit; - background-color: #eee; -} -.jumbotron h1, -.jumbotron .h1 { - color: inherit; -} -.jumbotron p { - margin-bottom: 15px; - font-size: 21px; - font-weight: 200; -} -.jumbotron > hr { - border-top-color: #d5d5d5; -} -.container .jumbotron, -.container-fluid .jumbotron { - border-radius: 6px; -} -.jumbotron .container { - max-width: 100%; -} -@media screen and (min-width: 768px) { - .jumbotron { - padding: 48px 0; - } - .container .jumbotron, - .container-fluid .jumbotron { - padding-right: 60px; - padding-left: 60px; - } - .jumbotron h1, - .jumbotron .h1 { - font-size: 63px; - } -} -.thumbnail { - display: block; - padding: 4px; - margin-bottom: 20px; - line-height: 1.42857143; - background-color: #fff; - border: 1px solid #ddd; - border-radius: 4px; - -webkit-transition: border .2s ease-in-out; - -o-transition: border .2s ease-in-out; - transition: border .2s ease-in-out; -} -.thumbnail > img, -.thumbnail a > img { - margin-right: auto; - margin-left: auto; -} -a.thumbnail:hover, -a.thumbnail:focus, -a.thumbnail.active { - border-color: #337ab7; -} -.thumbnail .caption { - padding: 9px; - color: #333; -} -.alert { - padding: 15px; - margin-bottom: 20px; - border: 1px solid transparent; - border-radius: 4px; -} -.alert h4 { - margin-top: 0; - color: inherit; -} -.alert .alert-link { - font-weight: bold; -} -.alert > p, -.alert > ul { - margin-bottom: 0; -} -.alert > p + p { - margin-top: 5px; -} -.alert-dismissable, -.alert-dismissible { - padding-right: 35px; -} -.alert-dismissable .close, -.alert-dismissible .close { - position: relative; - top: -2px; - right: -21px; - color: inherit; -} -.alert-success { - color: #3c763d; - background-color: #dff0d8; - border-color: #d6e9c6; -} -.alert-success hr { - border-top-color: #c9e2b3; -} -.alert-success .alert-link { - color: #2b542c; -} -.alert-info { - color: #31708f; - background-color: #d9edf7; - border-color: #bce8f1; -} -.alert-info hr { - border-top-color: #a6e1ec; -} -.alert-info .alert-link { - color: #245269; -} -.alert-warning { - color: #8a6d3b; - background-color: #fcf8e3; - border-color: #faebcc; -} -.alert-warning hr { - border-top-color: #f7e1b5; -} -.alert-warning .alert-link { - color: #66512c; -} -.alert-danger { - color: #a94442; - background-color: #f2dede; - border-color: #ebccd1; -} -.alert-danger hr { - border-top-color: #e4b9c0; -} -.alert-danger .alert-link { - color: #843534; -} -@-webkit-keyframes progress-bar-stripes { - from { - background-position: 40px 0; - } - to { - background-position: 0 0; - } -} -@-o-keyframes progress-bar-stripes { - from { - background-position: 40px 0; - } - to { - background-position: 0 0; - } -} -@keyframes progress-bar-stripes { - from { - background-position: 40px 0; - } - to { - background-position: 0 0; - } -} -.progress { - height: 20px; - margin-bottom: 20px; - overflow: hidden; - background-color: #f5f5f5; - border-radius: 4px; - -webkit-box-shadow: inset 0 1px 2px rgba(0, 0, 0, .1); - box-shadow: inset 0 1px 2px rgba(0, 0, 0, .1); -} -.progress-bar { - float: left; - width: 0; - height: 100%; - font-size: 12px; - line-height: 20px; - color: #fff; - text-align: center; - background-color: #337ab7; - -webkit-box-shadow: inset 0 -1px 0 rgba(0, 0, 0, .15); - box-shadow: inset 0 -1px 0 rgba(0, 0, 0, .15); - -webkit-transition: width .6s ease; - -o-transition: width .6s ease; - transition: width .6s ease; -} -.progress-striped .progress-bar, -.progress-bar-striped { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - -webkit-background-size: 40px 40px; - background-size: 40px 40px; -} -.progress.active .progress-bar, -.progress-bar.active { - -webkit-animation: progress-bar-stripes 2s linear infinite; - -o-animation: progress-bar-stripes 2s linear infinite; - animation: progress-bar-stripes 2s linear infinite; -} -.progress-bar-success { - background-color: #5cb85c; -} -.progress-striped .progress-bar-success { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); -} -.progress-bar-info { - background-color: #5bc0de; -} -.progress-striped .progress-bar-info { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); -} -.progress-bar-warning { - background-color: #f0ad4e; -} -.progress-striped .progress-bar-warning { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); -} -.progress-bar-danger { - background-color: #d9534f; -} -.progress-striped .progress-bar-danger { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, .15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, .15) 50%, rgba(255, 255, 255, .15) 75%, transparent 75%, transparent); -} -.media { - margin-top: 15px; -} -.media:first-child { - margin-top: 0; -} -.media-right, -.media > .pull-right { - padding-left: 10px; -} -.media-left, -.media > .pull-left { - padding-right: 10px; -} -.media-left, -.media-right, -.media-body { - display: table-cell; - vertical-align: top; -} -.media-middle { - vertical-align: middle; -} -.media-bottom { - vertical-align: bottom; -} -.media-heading { - margin-top: 0; - margin-bottom: 5px; -} -.media-list { - padding-left: 0; - list-style: none; -} -.list-group { - padding-left: 0; - margin-bottom: 20px; -} -.list-group-item { - position: relative; - display: block; - padding: 10px 15px; - margin-bottom: -1px; - background-color: #fff; - border: 1px solid #ddd; -} -.list-group-item:first-child { - border-top-left-radius: 4px; - border-top-right-radius: 4px; -} -.list-group-item:last-child { - margin-bottom: 0; - border-bottom-right-radius: 4px; - border-bottom-left-radius: 4px; -} -a.list-group-item { - color: #555; -} -a.list-group-item .list-group-item-heading { - color: #333; -} -a.list-group-item:hover, -a.list-group-item:focus { - color: #555; - text-decoration: none; - background-color: #f5f5f5; -} -.list-group-item.disabled, -.list-group-item.disabled:hover, -.list-group-item.disabled:focus { - color: #777; - cursor: not-allowed; - background-color: #eee; -} -.list-group-item.disabled .list-group-item-heading, -.list-group-item.disabled:hover .list-group-item-heading, -.list-group-item.disabled:focus .list-group-item-heading { - color: inherit; -} -.list-group-item.disabled .list-group-item-text, -.list-group-item.disabled:hover .list-group-item-text, -.list-group-item.disabled:focus .list-group-item-text { - color: #777; -} -.list-group-item.active, -.list-group-item.active:hover, -.list-group-item.active:focus { - z-index: 2; - color: #fff; - background-color: #337ab7; - border-color: #337ab7; -} -.list-group-item.active .list-group-item-heading, -.list-group-item.active:hover .list-group-item-heading, -.list-group-item.active:focus .list-group-item-heading, -.list-group-item.active .list-group-item-heading > small, -.list-group-item.active:hover .list-group-item-heading > small, -.list-group-item.active:focus .list-group-item-heading > small, -.list-group-item.active .list-group-item-heading > .small, -.list-group-item.active:hover .list-group-item-heading > .small, -.list-group-item.active:focus .list-group-item-heading > .small { - color: inherit; -} -.list-group-item.active .list-group-item-text, -.list-group-item.active:hover .list-group-item-text, -.list-group-item.active:focus .list-group-item-text { - color: #c7ddef; -} -.list-group-item-success { - color: #3c763d; - background-color: #dff0d8; -} -a.list-group-item-success { - color: #3c763d; -} -a.list-group-item-success .list-group-item-heading { - color: inherit; -} -a.list-group-item-success:hover, -a.list-group-item-success:focus { - color: #3c763d; - background-color: #d0e9c6; -} -a.list-group-item-success.active, -a.list-group-item-success.active:hover, -a.list-group-item-success.active:focus { - color: #fff; - background-color: #3c763d; - border-color: #3c763d; -} -.list-group-item-info { - color: #31708f; - background-color: #d9edf7; -} -a.list-group-item-info { - color: #31708f; -} -a.list-group-item-info .list-group-item-heading { - color: inherit; -} -a.list-group-item-info:hover, -a.list-group-item-info:focus { - color: #31708f; - background-color: #c4e3f3; -} -a.list-group-item-info.active, -a.list-group-item-info.active:hover, -a.list-group-item-info.active:focus { - color: #fff; - background-color: #31708f; - border-color: #31708f; -} -.list-group-item-warning { - color: #8a6d3b; - background-color: #fcf8e3; -} -a.list-group-item-warning { - color: #8a6d3b; -} -a.list-group-item-warning .list-group-item-heading { - color: inherit; -} -a.list-group-item-warning:hover, -a.list-group-item-warning:focus { - color: #8a6d3b; - background-color: #faf2cc; -} -a.list-group-item-warning.active, -a.list-group-item-warning.active:hover, -a.list-group-item-warning.active:focus { - color: #fff; - background-color: #8a6d3b; - border-color: #8a6d3b; -} -.list-group-item-danger { - color: #a94442; - background-color: #f2dede; -} -a.list-group-item-danger { - color: #a94442; -} -a.list-group-item-danger .list-group-item-heading { - color: inherit; -} -a.list-group-item-danger:hover, -a.list-group-item-danger:focus { - color: #a94442; - background-color: #ebcccc; -} -a.list-group-item-danger.active, -a.list-group-item-danger.active:hover, -a.list-group-item-danger.active:focus { - color: #fff; - background-color: #a94442; - border-color: #a94442; -} -.list-group-item-heading { - margin-top: 0; - margin-bottom: 5px; -} -.list-group-item-text { - margin-bottom: 0; - line-height: 1.3; -} -.panel { - margin-bottom: 20px; - background-color: #fff; - border: 1px solid transparent; - border-radius: 4px; - -webkit-box-shadow: 0 1px 1px rgba(0, 0, 0, .05); - box-shadow: 0 1px 1px rgba(0, 0, 0, .05); -} -.panel-body { - padding: 15px; -} -.panel-heading { - padding: 10px 15px; - border-bottom: 1px solid transparent; - border-top-left-radius: 3px; - border-top-right-radius: 3px; -} -.panel-heading > .dropdown .dropdown-toggle { - color: inherit; -} -.panel-title { - margin-top: 0; - margin-bottom: 0; - font-size: 16px; - color: inherit; -} -.panel-title > a { - color: inherit; -} -.panel-footer { - padding: 10px 15px; - background-color: #f5f5f5; - border-top: 1px solid #ddd; - border-bottom-right-radius: 3px; - border-bottom-left-radius: 3px; -} -.panel > .list-group, -.panel > .panel-collapse > .list-group { - margin-bottom: 0; -} -.panel > .list-group .list-group-item, -.panel > .panel-collapse > .list-group .list-group-item { - border-width: 1px 0; - border-radius: 0; -} -.panel > .list-group:first-child .list-group-item:first-child, -.panel > .panel-collapse > .list-group:first-child .list-group-item:first-child { - border-top: 0; - border-top-left-radius: 3px; - border-top-right-radius: 3px; -} -.panel > .list-group:last-child .list-group-item:last-child, -.panel > .panel-collapse > .list-group:last-child .list-group-item:last-child { - border-bottom: 0; - border-bottom-right-radius: 3px; - border-bottom-left-radius: 3px; -} -.panel-heading + .list-group .list-group-item:first-child { - border-top-width: 0; -} -.list-group + .panel-footer { - border-top-width: 0; -} -.panel > .table, -.panel > .table-responsive > .table, -.panel > .panel-collapse > .table { - margin-bottom: 0; -} -.panel > .table caption, -.panel > .table-responsive > .table caption, -.panel > .panel-collapse > .table caption { - padding-right: 15px; - padding-left: 15px; -} -.panel > .table:first-child, -.panel > .table-responsive:first-child > .table:first-child { - border-top-left-radius: 3px; - border-top-right-radius: 3px; -} -.panel > .table:first-child > thead:first-child > tr:first-child, -.panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child, -.panel > .table:first-child > tbody:first-child > tr:first-child, -.panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child { - border-top-left-radius: 3px; - border-top-right-radius: 3px; -} -.panel > .table:first-child > thead:first-child > tr:first-child td:first-child, -.panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child td:first-child, -.panel > .table:first-child > tbody:first-child > tr:first-child td:first-child, -.panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child td:first-child, -.panel > .table:first-child > thead:first-child > tr:first-child th:first-child, -.panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child th:first-child, -.panel > .table:first-child > tbody:first-child > tr:first-child th:first-child, -.panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child th:first-child { - border-top-left-radius: 3px; -} -.panel > .table:first-child > thead:first-child > tr:first-child td:last-child, -.panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child td:last-child, -.panel > .table:first-child > tbody:first-child > tr:first-child td:last-child, -.panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child td:last-child, -.panel > .table:first-child > thead:first-child > tr:first-child th:last-child, -.panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child th:last-child, -.panel > .table:first-child > tbody:first-child > tr:first-child th:last-child, -.panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child th:last-child { - border-top-right-radius: 3px; -} -.panel > .table:last-child, -.panel > .table-responsive:last-child > .table:last-child { - border-bottom-right-radius: 3px; - border-bottom-left-radius: 3px; -} -.panel > .table:last-child > tbody:last-child > tr:last-child, -.panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child, -.panel > .table:last-child > tfoot:last-child > tr:last-child, -.panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child { - border-bottom-right-radius: 3px; - border-bottom-left-radius: 3px; -} -.panel > .table:last-child > tbody:last-child > tr:last-child td:first-child, -.panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child td:first-child, -.panel > .table:last-child > tfoot:last-child > tr:last-child td:first-child, -.panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child td:first-child, -.panel > .table:last-child > tbody:last-child > tr:last-child th:first-child, -.panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child th:first-child, -.panel > .table:last-child > tfoot:last-child > tr:last-child th:first-child, -.panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child th:first-child { - border-bottom-left-radius: 3px; -} -.panel > .table:last-child > tbody:last-child > tr:last-child td:last-child, -.panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child td:last-child, -.panel > .table:last-child > tfoot:last-child > tr:last-child td:last-child, -.panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child td:last-child, -.panel > .table:last-child > tbody:last-child > tr:last-child th:last-child, -.panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child th:last-child, -.panel > .table:last-child > tfoot:last-child > tr:last-child th:last-child, -.panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child th:last-child { - border-bottom-right-radius: 3px; -} -.panel > .panel-body + .table, -.panel > .panel-body + .table-responsive, -.panel > .table + .panel-body, -.panel > .table-responsive + .panel-body { - border-top: 1px solid #ddd; -} -.panel > .table > tbody:first-child > tr:first-child th, -.panel > .table > tbody:first-child > tr:first-child td { - border-top: 0; -} -.panel > .table-bordered, -.panel > .table-responsive > .table-bordered { - border: 0; -} -.panel > .table-bordered > thead > tr > th:first-child, -.panel > .table-responsive > .table-bordered > thead > tr > th:first-child, -.panel > .table-bordered > tbody > tr > th:first-child, -.panel > .table-responsive > .table-bordered > tbody > tr > th:first-child, -.panel > .table-bordered > tfoot > tr > th:first-child, -.panel > .table-responsive > .table-bordered > tfoot > tr > th:first-child, -.panel > .table-bordered > thead > tr > td:first-child, -.panel > .table-responsive > .table-bordered > thead > tr > td:first-child, -.panel > .table-bordered > tbody > tr > td:first-child, -.panel > .table-responsive > .table-bordered > tbody > tr > td:first-child, -.panel > .table-bordered > tfoot > tr > td:first-child, -.panel > .table-responsive > .table-bordered > tfoot > tr > td:first-child { - border-left: 0; -} -.panel > .table-bordered > thead > tr > th:last-child, -.panel > .table-responsive > .table-bordered > thead > tr > th:last-child, -.panel > .table-bordered > tbody > tr > th:last-child, -.panel > .table-responsive > .table-bordered > tbody > tr > th:last-child, -.panel > .table-bordered > tfoot > tr > th:last-child, -.panel > .table-responsive > .table-bordered > tfoot > tr > th:last-child, -.panel > .table-bordered > thead > tr > td:last-child, -.panel > .table-responsive > .table-bordered > thead > tr > td:last-child, -.panel > .table-bordered > tbody > tr > td:last-child, -.panel > .table-responsive > .table-bordered > tbody > tr > td:last-child, -.panel > .table-bordered > tfoot > tr > td:last-child, -.panel > .table-responsive > .table-bordered > tfoot > tr > td:last-child { - border-right: 0; -} -.panel > .table-bordered > thead > tr:first-child > td, -.panel > .table-responsive > .table-bordered > thead > tr:first-child > td, -.panel > .table-bordered > tbody > tr:first-child > td, -.panel > .table-responsive > .table-bordered > tbody > tr:first-child > td, -.panel > .table-bordered > thead > tr:first-child > th, -.panel > .table-responsive > .table-bordered > thead > tr:first-child > th, -.panel > .table-bordered > tbody > tr:first-child > th, -.panel > .table-responsive > .table-bordered > tbody > tr:first-child > th { - border-bottom: 0; -} -.panel > .table-bordered > tbody > tr:last-child > td, -.panel > .table-responsive > .table-bordered > tbody > tr:last-child > td, -.panel > .table-bordered > tfoot > tr:last-child > td, -.panel > .table-responsive > .table-bordered > tfoot > tr:last-child > td, -.panel > .table-bordered > tbody > tr:last-child > th, -.panel > .table-responsive > .table-bordered > tbody > tr:last-child > th, -.panel > .table-bordered > tfoot > tr:last-child > th, -.panel > .table-responsive > .table-bordered > tfoot > tr:last-child > th { - border-bottom: 0; -} -.panel > .table-responsive { - margin-bottom: 0; - border: 0; -} -.panel-group { - margin-bottom: 20px; -} -.panel-group .panel { - margin-bottom: 0; - border-radius: 4px; -} -.panel-group .panel + .panel { - margin-top: 5px; -} -.panel-group .panel-heading { - border-bottom: 0; -} -.panel-group .panel-heading + .panel-collapse > .panel-body, -.panel-group .panel-heading + .panel-collapse > .list-group { - border-top: 1px solid #ddd; -} -.panel-group .panel-footer { - border-top: 0; -} -.panel-group .panel-footer + .panel-collapse .panel-body { - border-bottom: 1px solid #ddd; -} -.panel-default { - border-color: #ddd; -} -.panel-default > .panel-heading { - color: #333; - background-color: #f5f5f5; - border-color: #ddd; -} -.panel-default > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #ddd; -} -.panel-default > .panel-heading .badge { - color: #f5f5f5; - background-color: #333; -} -.panel-default > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #ddd; -} -.panel-primary { - border-color: #337ab7; -} -.panel-primary > .panel-heading { - color: #fff; - background-color: #337ab7; - border-color: #337ab7; -} -.panel-primary > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #337ab7; -} -.panel-primary > .panel-heading .badge { - color: #337ab7; - background-color: #fff; -} -.panel-primary > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #337ab7; -} -.panel-success { - border-color: #d6e9c6; -} -.panel-success > .panel-heading { - color: #3c763d; - background-color: #dff0d8; - border-color: #d6e9c6; -} -.panel-success > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #d6e9c6; -} -.panel-success > .panel-heading .badge { - color: #dff0d8; - background-color: #3c763d; -} -.panel-success > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #d6e9c6; -} -.panel-info { - border-color: #bce8f1; -} -.panel-info > .panel-heading { - color: #31708f; - background-color: #d9edf7; - border-color: #bce8f1; -} -.panel-info > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #bce8f1; -} -.panel-info > .panel-heading .badge { - color: #d9edf7; - background-color: #31708f; -} -.panel-info > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #bce8f1; -} -.panel-warning { - border-color: #faebcc; -} -.panel-warning > .panel-heading { - color: #8a6d3b; - background-color: #fcf8e3; - border-color: #faebcc; -} -.panel-warning > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #faebcc; -} -.panel-warning > .panel-heading .badge { - color: #fcf8e3; - background-color: #8a6d3b; -} -.panel-warning > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #faebcc; -} -.panel-danger { - border-color: #ebccd1; -} -.panel-danger > .panel-heading { - color: #a94442; - background-color: #f2dede; - border-color: #ebccd1; -} -.panel-danger > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #ebccd1; -} -.panel-danger > .panel-heading .badge { - color: #f2dede; - background-color: #a94442; -} -.panel-danger > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #ebccd1; -} -.embed-responsive { - position: relative; - display: block; - height: 0; - padding: 0; - overflow: hidden; -} -.embed-responsive .embed-responsive-item, -.embed-responsive iframe, -.embed-responsive embed, -.embed-responsive object, -.embed-responsive video { - position: absolute; - top: 0; - bottom: 0; - left: 0; - width: 100%; - height: 100%; - border: 0; -} -.embed-responsive.embed-responsive-16by9 { - padding-bottom: 56.25%; -} -.embed-responsive.embed-responsive-4by3 { - padding-bottom: 75%; -} -.well { - min-height: 20px; - padding: 19px; - margin-bottom: 20px; - background-color: #f5f5f5; - border: 1px solid #e3e3e3; - border-radius: 4px; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, .05); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, .05); -} -.well blockquote { - border-color: #ddd; - border-color: rgba(0, 0, 0, .15); -} -.well-lg { - padding: 24px; - border-radius: 6px; -} -.well-sm { - padding: 9px; - border-radius: 3px; -} -.close { - float: right; - font-size: 21px; - font-weight: bold; - line-height: 1; - color: #000; - text-shadow: 0 1px 0 #fff; - filter: alpha(opacity=20); - opacity: .2; -} -.close:hover, -.close:focus { - color: #000; - text-decoration: none; - cursor: pointer; - filter: alpha(opacity=50); - opacity: .5; -} -button.close { - -webkit-appearance: none; - padding: 0; - cursor: pointer; - background: transparent; - border: 0; -} -.modal-open { - overflow: hidden; -} -.modal { - position: fixed; - top: 0; - right: 0; - bottom: 0; - left: 0; - z-index: 1040; - display: none; - overflow: hidden; - -webkit-overflow-scrolling: touch; - outline: 0; -} -.modal.fade .modal-dialog { - -webkit-transition: -webkit-transform .3s ease-out; - -o-transition: -o-transform .3s ease-out; - transition: transform .3s ease-out; - -webkit-transform: translate(0, -25%); - -ms-transform: translate(0, -25%); - -o-transform: translate(0, -25%); - transform: translate(0, -25%); -} -.modal.in .modal-dialog { - -webkit-transform: translate(0, 0); - -ms-transform: translate(0, 0); - -o-transform: translate(0, 0); - transform: translate(0, 0); -} -.modal-open .modal { - overflow-x: hidden; - overflow-y: auto; -} -.modal-dialog { - position: relative; - width: auto; - margin: 10px; -} -.modal-content { - position: relative; - background-color: #fff; - -webkit-background-clip: padding-box; - background-clip: padding-box; - border: 1px solid #999; - border: 1px solid rgba(0, 0, 0, .2); - border-radius: 6px; - outline: 0; - -webkit-box-shadow: 0 3px 9px rgba(0, 0, 0, .5); - box-shadow: 0 3px 9px rgba(0, 0, 0, .5); -} -.modal-backdrop { - position: absolute; - top: 0; - right: 0; - left: 0; - background-color: #000; -} -.modal-backdrop.fade { - filter: alpha(opacity=0); - opacity: 0; -} -.modal-backdrop.in { - filter: alpha(opacity=50); - opacity: .5; -} -.modal-header { - min-height: 16.42857143px; - padding: 15px; - border-bottom: 1px solid #e5e5e5; -} -.modal-header .close { - margin-top: -2px; -} -.modal-title { - margin: 0; - line-height: 1.42857143; -} -.modal-body { - position: relative; - padding: 15px; -} -.modal-footer { - padding: 15px; - text-align: right; - border-top: 1px solid #e5e5e5; -} -.modal-footer .btn + .btn { - margin-bottom: 0; - margin-left: 5px; -} -.modal-footer .btn-group .btn + .btn { - margin-left: -1px; -} -.modal-footer .btn-block + .btn-block { - margin-left: 0; -} -.modal-scrollbar-measure { - position: absolute; - top: -9999px; - width: 50px; - height: 50px; - overflow: scroll; -} -@media (min-width: 768px) { - .modal-dialog { - width: 600px; - margin: 30px auto; - } - .modal-content { - -webkit-box-shadow: 0 5px 15px rgba(0, 0, 0, .5); - box-shadow: 0 5px 15px rgba(0, 0, 0, .5); - } - .modal-sm { - width: 300px; - } -} -@media (min-width: 992px) { - .modal-lg { - width: 900px; - } -} -.tooltip { - position: absolute; - z-index: 1070; - display: block; - font-family: "Helvetica Neue", Helvetica, Arial, sans-serif; - font-size: 12px; - font-weight: normal; - line-height: 1.4; - visibility: visible; - filter: alpha(opacity=0); - opacity: 0; -} -.tooltip.in { - filter: alpha(opacity=90); - opacity: .9; -} -.tooltip.top { - padding: 5px 0; - margin-top: -3px; -} -.tooltip.right { - padding: 0 5px; - margin-left: 3px; -} -.tooltip.bottom { - padding: 5px 0; - margin-top: 3px; -} -.tooltip.left { - padding: 0 5px; - margin-left: -3px; -} -.tooltip-inner { - max-width: 200px; - padding: 3px 8px; - color: #fff; - text-align: center; - text-decoration: none; - background-color: #000; - border-radius: 4px; -} -.tooltip-arrow { - position: absolute; - width: 0; - height: 0; - border-color: transparent; - border-style: solid; -} -.tooltip.top .tooltip-arrow { - bottom: 0; - left: 50%; - margin-left: -5px; - border-width: 5px 5px 0; - border-top-color: #000; -} -.tooltip.top-left .tooltip-arrow { - right: 5px; - bottom: 0; - margin-bottom: -5px; - border-width: 5px 5px 0; - border-top-color: #000; -} -.tooltip.top-right .tooltip-arrow { - bottom: 0; - left: 5px; - margin-bottom: -5px; - border-width: 5px 5px 0; - border-top-color: #000; -} -.tooltip.right .tooltip-arrow { - top: 50%; - left: 0; - margin-top: -5px; - border-width: 5px 5px 5px 0; - border-right-color: #000; -} -.tooltip.left .tooltip-arrow { - top: 50%; - right: 0; - margin-top: -5px; - border-width: 5px 0 5px 5px; - border-left-color: #000; -} -.tooltip.bottom .tooltip-arrow { - top: 0; - left: 50%; - margin-left: -5px; - border-width: 0 5px 5px; - border-bottom-color: #000; -} -.tooltip.bottom-left .tooltip-arrow { - top: 0; - right: 5px; - margin-top: -5px; - border-width: 0 5px 5px; - border-bottom-color: #000; -} -.tooltip.bottom-right .tooltip-arrow { - top: 0; - left: 5px; - margin-top: -5px; - border-width: 0 5px 5px; - border-bottom-color: #000; -} -.popover { - position: absolute; - top: 0; - left: 0; - z-index: 1060; - display: none; - max-width: 276px; - padding: 1px; - font-family: "Helvetica Neue", Helvetica, Arial, sans-serif; - font-size: 14px; - font-weight: normal; - line-height: 1.42857143; - text-align: left; - white-space: normal; - background-color: #fff; - -webkit-background-clip: padding-box; - background-clip: padding-box; - border: 1px solid #ccc; - border: 1px solid rgba(0, 0, 0, .2); - border-radius: 6px; - -webkit-box-shadow: 0 5px 10px rgba(0, 0, 0, .2); - box-shadow: 0 5px 10px rgba(0, 0, 0, .2); -} -.popover.top { - margin-top: -10px; -} -.popover.right { - margin-left: 10px; -} -.popover.bottom { - margin-top: 10px; -} -.popover.left { - margin-left: -10px; -} -.popover-title { - padding: 8px 14px; - margin: 0; - font-size: 14px; - background-color: #f7f7f7; - border-bottom: 1px solid #ebebeb; - border-radius: 5px 5px 0 0; -} -.popover-content { - padding: 9px 14px; -} -.popover > .arrow, -.popover > .arrow:after { - position: absolute; - display: block; - width: 0; - height: 0; - border-color: transparent; - border-style: solid; -} -.popover > .arrow { - border-width: 11px; -} -.popover > .arrow:after { - content: ""; - border-width: 10px; -} -.popover.top > .arrow { - bottom: -11px; - left: 50%; - margin-left: -11px; - border-top-color: #999; - border-top-color: rgba(0, 0, 0, .25); - border-bottom-width: 0; -} -.popover.top > .arrow:after { - bottom: 1px; - margin-left: -10px; - content: " "; - border-top-color: #fff; - border-bottom-width: 0; -} -.popover.right > .arrow { - top: 50%; - left: -11px; - margin-top: -11px; - border-right-color: #999; - border-right-color: rgba(0, 0, 0, .25); - border-left-width: 0; -} -.popover.right > .arrow:after { - bottom: -10px; - left: 1px; - content: " "; - border-right-color: #fff; - border-left-width: 0; -} -.popover.bottom > .arrow { - top: -11px; - left: 50%; - margin-left: -11px; - border-top-width: 0; - border-bottom-color: #999; - border-bottom-color: rgba(0, 0, 0, .25); -} -.popover.bottom > .arrow:after { - top: 1px; - margin-left: -10px; - content: " "; - border-top-width: 0; - border-bottom-color: #fff; -} -.popover.left > .arrow { - top: 50%; - right: -11px; - margin-top: -11px; - border-right-width: 0; - border-left-color: #999; - border-left-color: rgba(0, 0, 0, .25); -} -.popover.left > .arrow:after { - right: 1px; - bottom: -10px; - content: " "; - border-right-width: 0; - border-left-color: #fff; -} -.carousel { - position: relative; -} -.carousel-inner { - position: relative; - width: 100%; - overflow: hidden; -} -.carousel-inner > .item { - position: relative; - display: none; - -webkit-transition: .6s ease-in-out left; - -o-transition: .6s ease-in-out left; - transition: .6s ease-in-out left; -} -.carousel-inner > .item > img, -.carousel-inner > .item > a > img { - line-height: 1; -} -@media all and (transform-3d), (-webkit-transform-3d) { - .carousel-inner > .item { - -webkit-transition: -webkit-transform .6s ease-in-out; - -o-transition: -o-transform .6s ease-in-out; - transition: transform .6s ease-in-out; - - -webkit-backface-visibility: hidden; - backface-visibility: hidden; - -webkit-perspective: 1000; - perspective: 1000; - } - .carousel-inner > .item.next, - .carousel-inner > .item.active.right { - left: 0; - -webkit-transform: translate3d(100%, 0, 0); - transform: translate3d(100%, 0, 0); - } - .carousel-inner > .item.prev, - .carousel-inner > .item.active.left { - left: 0; - -webkit-transform: translate3d(-100%, 0, 0); - transform: translate3d(-100%, 0, 0); - } - .carousel-inner > .item.next.left, - .carousel-inner > .item.prev.right, - .carousel-inner > .item.active { - left: 0; - -webkit-transform: translate3d(0, 0, 0); - transform: translate3d(0, 0, 0); - } -} -.carousel-inner > .active, -.carousel-inner > .next, -.carousel-inner > .prev { - display: block; -} -.carousel-inner > .active { - left: 0; -} -.carousel-inner > .next, -.carousel-inner > .prev { - position: absolute; - top: 0; - width: 100%; -} -.carousel-inner > .next { - left: 100%; -} -.carousel-inner > .prev { - left: -100%; -} -.carousel-inner > .next.left, -.carousel-inner > .prev.right { - left: 0; -} -.carousel-inner > .active.left { - left: -100%; -} -.carousel-inner > .active.right { - left: 100%; -} -.carousel-control { - position: absolute; - top: 0; - bottom: 0; - left: 0; - width: 15%; - font-size: 20px; - color: #fff; - text-align: center; - text-shadow: 0 1px 2px rgba(0, 0, 0, .6); - filter: alpha(opacity=50); - opacity: .5; -} -.carousel-control.left { - background-image: -webkit-linear-gradient(left, rgba(0, 0, 0, .5) 0%, rgba(0, 0, 0, .0001) 100%); - background-image: -o-linear-gradient(left, rgba(0, 0, 0, .5) 0%, rgba(0, 0, 0, .0001) 100%); - background-image: -webkit-gradient(linear, left top, right top, from(rgba(0, 0, 0, .5)), to(rgba(0, 0, 0, .0001))); - background-image: linear-gradient(to right, rgba(0, 0, 0, .5) 0%, rgba(0, 0, 0, .0001) 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1); - background-repeat: repeat-x; -} -.carousel-control.right { - right: 0; - left: auto; - background-image: -webkit-linear-gradient(left, rgba(0, 0, 0, .0001) 0%, rgba(0, 0, 0, .5) 100%); - background-image: -o-linear-gradient(left, rgba(0, 0, 0, .0001) 0%, rgba(0, 0, 0, .5) 100%); - background-image: -webkit-gradient(linear, left top, right top, from(rgba(0, 0, 0, .0001)), to(rgba(0, 0, 0, .5))); - background-image: linear-gradient(to right, rgba(0, 0, 0, .0001) 0%, rgba(0, 0, 0, .5) 100%); - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1); - background-repeat: repeat-x; -} -.carousel-control:hover, -.carousel-control:focus { - color: #fff; - text-decoration: none; - filter: alpha(opacity=90); - outline: 0; - opacity: .9; -} -.carousel-control .icon-prev, -.carousel-control .icon-next, -.carousel-control .glyphicon-chevron-left, -.carousel-control .glyphicon-chevron-right { - position: absolute; - top: 50%; - z-index: 5; - display: inline-block; -} -.carousel-control .icon-prev, -.carousel-control .glyphicon-chevron-left { - left: 50%; - margin-left: -10px; -} -.carousel-control .icon-next, -.carousel-control .glyphicon-chevron-right { - right: 50%; - margin-right: -10px; -} -.carousel-control .icon-prev, -.carousel-control .icon-next { - width: 20px; - height: 20px; - margin-top: -10px; - font-family: serif; -} -.carousel-control .icon-prev:before { - content: '\2039'; -} -.carousel-control .icon-next:before { - content: '\203a'; -} -.carousel-indicators { - position: absolute; - bottom: 10px; - left: 50%; - z-index: 15; - width: 60%; - padding-left: 0; - margin-left: -30%; - text-align: center; - list-style: none; -} -.carousel-indicators li { - display: inline-block; - width: 10px; - height: 10px; - margin: 1px; - text-indent: -999px; - cursor: pointer; - background-color: #000 \9; - background-color: rgba(0, 0, 0, 0); - border: 1px solid #fff; - border-radius: 10px; -} -.carousel-indicators .active { - width: 12px; - height: 12px; - margin: 0; - background-color: #fff; -} -.carousel-caption { - position: absolute; - right: 15%; - bottom: 20px; - left: 15%; - z-index: 10; - padding-top: 20px; - padding-bottom: 20px; - color: #fff; - text-align: center; - text-shadow: 0 1px 2px rgba(0, 0, 0, .6); -} -.carousel-caption .btn { - text-shadow: none; -} -@media screen and (min-width: 768px) { - .carousel-control .glyphicon-chevron-left, - .carousel-control .glyphicon-chevron-right, - .carousel-control .icon-prev, - .carousel-control .icon-next { - width: 30px; - height: 30px; - margin-top: -15px; - font-size: 30px; - } - .carousel-control .glyphicon-chevron-left, - .carousel-control .icon-prev { - margin-left: -15px; - } - .carousel-control .glyphicon-chevron-right, - .carousel-control .icon-next { - margin-right: -15px; - } - .carousel-caption { - right: 20%; - left: 20%; - padding-bottom: 30px; - } - .carousel-indicators { - bottom: 20px; - } -} -.clearfix:before, -.clearfix:after, -.dl-horizontal dd:before, -.dl-horizontal dd:after, -.container:before, -.container:after, -.container-fluid:before, -.container-fluid:after, -.row:before, -.row:after, -.form-horizontal .form-group:before, -.form-horizontal .form-group:after, -.btn-toolbar:before, -.btn-toolbar:after, -.btn-group-vertical > .btn-group:before, -.btn-group-vertical > .btn-group:after, -.nav:before, -.nav:after, -.navbar:before, -.navbar:after, -.navbar-header:before, -.navbar-header:after, -.navbar-collapse:before, -.navbar-collapse:after, -.pager:before, -.pager:after, -.panel-body:before, -.panel-body:after, -.modal-footer:before, -.modal-footer:after { - display: table; - content: " "; -} -.clearfix:after, -.dl-horizontal dd:after, -.container:after, -.container-fluid:after, -.row:after, -.form-horizontal .form-group:after, -.btn-toolbar:after, -.btn-group-vertical > .btn-group:after, -.nav:after, -.navbar:after, -.navbar-header:after, -.navbar-collapse:after, -.pager:after, -.panel-body:after, -.modal-footer:after { - clear: both; -} -.center-block { - display: block; - margin-right: auto; - margin-left: auto; -} -.pull-right { - float: right !important; -} -.pull-left { - float: left !important; -} -.hide { - display: none !important; -} -.show { - display: block !important; -} -.invisible { - visibility: hidden; -} -.text-hide { - font: 0/0 a; - color: transparent; - text-shadow: none; - background-color: transparent; - border: 0; -} -.hidden { - display: none !important; - visibility: hidden !important; -} -.affix { - position: fixed; -} -@-ms-viewport { - width: device-width; -} -.visible-xs, -.visible-sm, -.visible-md, -.visible-lg { - display: none !important; -} -.visible-xs-block, -.visible-xs-inline, -.visible-xs-inline-block, -.visible-sm-block, -.visible-sm-inline, -.visible-sm-inline-block, -.visible-md-block, -.visible-md-inline, -.visible-md-inline-block, -.visible-lg-block, -.visible-lg-inline, -.visible-lg-inline-block { - display: none !important; -} -@media (max-width: 767px) { - .visible-xs { - display: block !important; - } - table.visible-xs { - display: table; - } - tr.visible-xs { - display: table-row !important; - } - th.visible-xs, - td.visible-xs { - display: table-cell !important; - } -} -@media (max-width: 767px) { - .visible-xs-block { - display: block !important; - } -} -@media (max-width: 767px) { - .visible-xs-inline { - display: inline !important; - } -} -@media (max-width: 767px) { - .visible-xs-inline-block { - display: inline-block !important; - } -} -@media (min-width: 768px) and (max-width: 991px) { - .visible-sm { - display: block !important; - } - table.visible-sm { - display: table; - } - tr.visible-sm { - display: table-row !important; - } - th.visible-sm, - td.visible-sm { - display: table-cell !important; - } -} -@media (min-width: 768px) and (max-width: 991px) { - .visible-sm-block { - display: block !important; - } -} -@media (min-width: 768px) and (max-width: 991px) { - .visible-sm-inline { - display: inline !important; - } -} -@media (min-width: 768px) and (max-width: 991px) { - .visible-sm-inline-block { - display: inline-block !important; - } -} -@media (min-width: 992px) and (max-width: 1199px) { - .visible-md { - display: block !important; - } - table.visible-md { - display: table; - } - tr.visible-md { - display: table-row !important; - } - th.visible-md, - td.visible-md { - display: table-cell !important; - } -} -@media (min-width: 992px) and (max-width: 1199px) { - .visible-md-block { - display: block !important; - } -} -@media (min-width: 992px) and (max-width: 1199px) { - .visible-md-inline { - display: inline !important; - } -} -@media (min-width: 992px) and (max-width: 1199px) { - .visible-md-inline-block { - display: inline-block !important; - } -} -@media (min-width: 1200px) { - .visible-lg { - display: block !important; - } - table.visible-lg { - display: table; - } - tr.visible-lg { - display: table-row !important; - } - th.visible-lg, - td.visible-lg { - display: table-cell !important; - } -} -@media (min-width: 1200px) { - .visible-lg-block { - display: block !important; - } -} -@media (min-width: 1200px) { - .visible-lg-inline { - display: inline !important; - } -} -@media (min-width: 1200px) { - .visible-lg-inline-block { - display: inline-block !important; - } -} -@media (max-width: 767px) { - .hidden-xs { - display: none !important; - } -} -@media (min-width: 768px) and (max-width: 991px) { - .hidden-sm { - display: none !important; - } -} -@media (min-width: 992px) and (max-width: 1199px) { - .hidden-md { - display: none !important; - } -} -@media (min-width: 1200px) { - .hidden-lg { - display: none !important; - } -} -.visible-print { - display: none !important; -} -@media print { - .visible-print { - display: block !important; - } - table.visible-print { - display: table; - } - tr.visible-print { - display: table-row !important; - } - th.visible-print, - td.visible-print { - display: table-cell !important; - } -} -.visible-print-block { - display: none !important; -} -@media print { - .visible-print-block { - display: block !important; - } -} -.visible-print-inline { - display: none !important; -} -@media print { - .visible-print-inline { - display: inline !important; - } -} -.visible-print-inline-block { - display: none !important; -} -@media print { - .visible-print-inline-block { - display: inline-block !important; - } -} -@media print { - .hidden-print { - display: none !important; - } -} -/*# sourceMappingURL=bootstrap.css.map */ diff --git a/www/bootstrap-3.3.1/css/bootstrap.min.css b/www/bootstrap-3.3.1/css/bootstrap.min.css deleted file mode 100644 index c79e091..0000000 --- a/www/bootstrap-3.3.1/css/bootstrap.min.css +++ /dev/null @@ -1,5 +0,0 @@ -/*! - * Bootstrap v3.3.1 (http://getbootstrap.com) - * Copyright 2011-2014 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE) - *//*! normalize.css v3.0.2 | MIT License | git.io/normalize */html{font-family:sans-serif;-webkit-text-size-adjust:100%;-ms-text-size-adjust:100%}body{margin:0}article,aside,details,figcaption,figure,footer,header,hgroup,main,menu,nav,section,summary{display:block}audio,canvas,progress,video{display:inline-block;vertical-align:baseline}audio:not([controls]){display:none;height:0}[hidden],template{display:none}a{background-color:transparent}a:active,a:hover{outline:0}abbr[title]{border-bottom:1px dotted}b,strong{font-weight:700}dfn{font-style:italic}h1{margin:.67em 0;font-size:2em}mark{color:#000;background:#ff0}small{font-size:80%}sub,sup{position:relative;font-size:75%;line-height:0;vertical-align:baseline}sup{top:-.5em}sub{bottom:-.25em}img{border:0}svg:not(:root){overflow:hidden}figure{margin:1em 40px}hr{height:0;-webkit-box-sizing:content-box;-moz-box-sizing:content-box;box-sizing:content-box}pre{overflow:auto}code,kbd,pre,samp{font-family:monospace,monospace;font-size:1em}button,input,optgroup,select,textarea{margin:0;font:inherit;color:inherit}button{overflow:visible}button,select{text-transform:none}button,html input[type=button],input[type=reset],input[type=submit]{-webkit-appearance:button;cursor:pointer}button[disabled],html input[disabled]{cursor:default}button::-moz-focus-inner,input::-moz-focus-inner{padding:0;border:0}input{line-height:normal}input[type=checkbox],input[type=radio]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box;padding:0}input[type=number]::-webkit-inner-spin-button,input[type=number]::-webkit-outer-spin-button{height:auto}input[type=search]{-webkit-box-sizing:content-box;-moz-box-sizing:content-box;box-sizing:content-box;-webkit-appearance:textfield}input[type=search]::-webkit-search-cancel-button,input[type=search]::-webkit-search-decoration{-webkit-appearance:none}fieldset{padding:.35em .625em .75em;margin:0 2px;border:1px solid silver}legend{padding:0;border:0}textarea{overflow:auto}optgroup{font-weight:700}table{border-spacing:0;border-collapse:collapse}td,th{padding:0}/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */@media print{*,:before,:after{color:#000!important;text-shadow:none!important;background:transparent!important;-webkit-box-shadow:none!important;box-shadow:none!important}a,a:visited{text-decoration:underline}a[href]:after{content:" (" attr(href) ")"}abbr[title]:after{content:" (" attr(title) ")"}a[href^="#"]:after,a[href^="javascript:"]:after{content:""}pre,blockquote{border:1px solid #999;page-break-inside:avoid}thead{display:table-header-group}tr,img{page-break-inside:avoid}img{max-width:100%!important}p,h2,h3{orphans:3;widows:3}h2,h3{page-break-after:avoid}select{background:#fff!important}.navbar{display:none}.btn>.caret,.dropup>.btn>.caret{border-top-color:#000!important}.label{border:1px solid #000}.table{border-collapse:collapse!important}.table td,.table th{background-color:#fff!important}.table-bordered th,.table-bordered td{border:1px solid #ddd!important}}@font-face{font-family:'Glyphicons Halflings';src:url(../fonts/glyphicons-halflings-regular.eot);src:url(../fonts/glyphicons-halflings-regular.eot?#iefix) format('embedded-opentype'),url(../fonts/glyphicons-halflings-regular.woff) format('woff'),url(../fonts/glyphicons-halflings-regular.ttf) format('truetype'),url(../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular) format('svg')}.glyphicon{position:relative;top:1px;display:inline-block;font-family:'Glyphicons Halflings';font-style:normal;font-weight:400;line-height:1;-webkit-font-smoothing:antialiased;-moz-osx-font-smoothing:grayscale}.glyphicon-asterisk:before{content:"\2a"}.glyphicon-plus:before{content:"\2b"}.glyphicon-euro:before,.glyphicon-eur:before{content:"\20ac"}.glyphicon-minus:before{content:"\2212"}.glyphicon-cloud:before{content:"\2601"}.glyphicon-envelope:before{content:"\2709"}.glyphicon-pencil:before{content:"\270f"}.glyphicon-glass:before{content:"\e001"}.glyphicon-music:before{content:"\e002"}.glyphicon-search:before{content:"\e003"}.glyphicon-heart:before{content:"\e005"}.glyphicon-star:before{content:"\e006"}.glyphicon-star-empty:before{content:"\e007"}.glyphicon-user:before{content:"\e008"}.glyphicon-film:before{content:"\e009"}.glyphicon-th-large:before{content:"\e010"}.glyphicon-th:before{content:"\e011"}.glyphicon-th-list:before{content:"\e012"}.glyphicon-ok:before{content:"\e013"}.glyphicon-remove:before{content:"\e014"}.glyphicon-zoom-in:before{content:"\e015"}.glyphicon-zoom-out:before{content:"\e016"}.glyphicon-off:before{content:"\e017"}.glyphicon-signal:before{content:"\e018"}.glyphicon-cog:before{content:"\e019"}.glyphicon-trash:before{content:"\e020"}.glyphicon-home:before{content:"\e021"}.glyphicon-file:before{content:"\e022"}.glyphicon-time:before{content:"\e023"}.glyphicon-road:before{content:"\e024"}.glyphicon-download-alt:before{content:"\e025"}.glyphicon-download:before{content:"\e026"}.glyphicon-upload:before{content:"\e027"}.glyphicon-inbox:before{content:"\e028"}.glyphicon-play-circle:before{content:"\e029"}.glyphicon-repeat:before{content:"\e030"}.glyphicon-refresh:before{content:"\e031"}.glyphicon-list-alt:before{content:"\e032"}.glyphicon-lock:before{content:"\e033"}.glyphicon-flag:before{content:"\e034"}.glyphicon-headphones:before{content:"\e035"}.glyphicon-volume-off:before{content:"\e036"}.glyphicon-volume-down:before{content:"\e037"}.glyphicon-volume-up:before{content:"\e038"}.glyphicon-qrcode:before{content:"\e039"}.glyphicon-barcode:before{content:"\e040"}.glyphicon-tag:before{content:"\e041"}.glyphicon-tags:before{content:"\e042"}.glyphicon-book:before{content:"\e043"}.glyphicon-bookmark:before{content:"\e044"}.glyphicon-print:before{content:"\e045"}.glyphicon-camera:before{content:"\e046"}.glyphicon-font:before{content:"\e047"}.glyphicon-bold:before{content:"\e048"}.glyphicon-italic:before{content:"\e049"}.glyphicon-text-height:before{content:"\e050"}.glyphicon-text-width:before{content:"\e051"}.glyphicon-align-left:before{content:"\e052"}.glyphicon-align-center:before{content:"\e053"}.glyphicon-align-right:before{content:"\e054"}.glyphicon-align-justify:before{content:"\e055"}.glyphicon-list:before{content:"\e056"}.glyphicon-indent-left:before{content:"\e057"}.glyphicon-indent-right:before{content:"\e058"}.glyphicon-facetime-video:before{content:"\e059"}.glyphicon-picture:before{content:"\e060"}.glyphicon-map-marker:before{content:"\e062"}.glyphicon-adjust:before{content:"\e063"}.glyphicon-tint:before{content:"\e064"}.glyphicon-edit:before{content:"\e065"}.glyphicon-share:before{content:"\e066"}.glyphicon-check:before{content:"\e067"}.glyphicon-move:before{content:"\e068"}.glyphicon-step-backward:before{content:"\e069"}.glyphicon-fast-backward:before{content:"\e070"}.glyphicon-backward:before{content:"\e071"}.glyphicon-play:before{content:"\e072"}.glyphicon-pause:before{content:"\e073"}.glyphicon-stop:before{content:"\e074"}.glyphicon-forward:before{content:"\e075"}.glyphicon-fast-forward:before{content:"\e076"}.glyphicon-step-forward:before{content:"\e077"}.glyphicon-eject:before{content:"\e078"}.glyphicon-chevron-left:before{content:"\e079"}.glyphicon-chevron-right:before{content:"\e080"}.glyphicon-plus-sign:before{content:"\e081"}.glyphicon-minus-sign:before{content:"\e082"}.glyphicon-remove-sign:before{content:"\e083"}.glyphicon-ok-sign:before{content:"\e084"}.glyphicon-question-sign:before{content:"\e085"}.glyphicon-info-sign:before{content:"\e086"}.glyphicon-screenshot:before{content:"\e087"}.glyphicon-remove-circle:before{content:"\e088"}.glyphicon-ok-circle:before{content:"\e089"}.glyphicon-ban-circle:before{content:"\e090"}.glyphicon-arrow-left:before{content:"\e091"}.glyphicon-arrow-right:before{content:"\e092"}.glyphicon-arrow-up:before{content:"\e093"}.glyphicon-arrow-down:before{content:"\e094"}.glyphicon-share-alt:before{content:"\e095"}.glyphicon-resize-full:before{content:"\e096"}.glyphicon-resize-small:before{content:"\e097"}.glyphicon-exclamation-sign:before{content:"\e101"}.glyphicon-gift:before{content:"\e102"}.glyphicon-leaf:before{content:"\e103"}.glyphicon-fire:before{content:"\e104"}.glyphicon-eye-open:before{content:"\e105"}.glyphicon-eye-close:before{content:"\e106"}.glyphicon-warning-sign:before{content:"\e107"}.glyphicon-plane:before{content:"\e108"}.glyphicon-calendar:before{content:"\e109"}.glyphicon-random:before{content:"\e110"}.glyphicon-comment:before{content:"\e111"}.glyphicon-magnet:before{content:"\e112"}.glyphicon-chevron-up:before{content:"\e113"}.glyphicon-chevron-down:before{content:"\e114"}.glyphicon-retweet:before{content:"\e115"}.glyphicon-shopping-cart:before{content:"\e116"}.glyphicon-folder-close:before{content:"\e117"}.glyphicon-folder-open:before{content:"\e118"}.glyphicon-resize-vertical:before{content:"\e119"}.glyphicon-resize-horizontal:before{content:"\e120"}.glyphicon-hdd:before{content:"\e121"}.glyphicon-bullhorn:before{content:"\e122"}.glyphicon-bell:before{content:"\e123"}.glyphicon-certificate:before{content:"\e124"}.glyphicon-thumbs-up:before{content:"\e125"}.glyphicon-thumbs-down:before{content:"\e126"}.glyphicon-hand-right:before{content:"\e127"}.glyphicon-hand-left:before{content:"\e128"}.glyphicon-hand-up:before{content:"\e129"}.glyphicon-hand-down:before{content:"\e130"}.glyphicon-circle-arrow-right:before{content:"\e131"}.glyphicon-circle-arrow-left:before{content:"\e132"}.glyphicon-circle-arrow-up:before{content:"\e133"}.glyphicon-circle-arrow-down:before{content:"\e134"}.glyphicon-globe:before{content:"\e135"}.glyphicon-wrench:before{content:"\e136"}.glyphicon-tasks:before{content:"\e137"}.glyphicon-filter:before{content:"\e138"}.glyphicon-briefcase:before{content:"\e139"}.glyphicon-fullscreen:before{content:"\e140"}.glyphicon-dashboard:before{content:"\e141"}.glyphicon-paperclip:before{content:"\e142"}.glyphicon-heart-empty:before{content:"\e143"}.glyphicon-link:before{content:"\e144"}.glyphicon-phone:before{content:"\e145"}.glyphicon-pushpin:before{content:"\e146"}.glyphicon-usd:before{content:"\e148"}.glyphicon-gbp:before{content:"\e149"}.glyphicon-sort:before{content:"\e150"}.glyphicon-sort-by-alphabet:before{content:"\e151"}.glyphicon-sort-by-alphabet-alt:before{content:"\e152"}.glyphicon-sort-by-order:before{content:"\e153"}.glyphicon-sort-by-order-alt:before{content:"\e154"}.glyphicon-sort-by-attributes:before{content:"\e155"}.glyphicon-sort-by-attributes-alt:before{content:"\e156"}.glyphicon-unchecked:before{content:"\e157"}.glyphicon-expand:before{content:"\e158"}.glyphicon-collapse-down:before{content:"\e159"}.glyphicon-collapse-up:before{content:"\e160"}.glyphicon-log-in:before{content:"\e161"}.glyphicon-flash:before{content:"\e162"}.glyphicon-log-out:before{content:"\e163"}.glyphicon-new-window:before{content:"\e164"}.glyphicon-record:before{content:"\e165"}.glyphicon-save:before{content:"\e166"}.glyphicon-open:before{content:"\e167"}.glyphicon-saved:before{content:"\e168"}.glyphicon-import:before{content:"\e169"}.glyphicon-export:before{content:"\e170"}.glyphicon-send:before{content:"\e171"}.glyphicon-floppy-disk:before{content:"\e172"}.glyphicon-floppy-saved:before{content:"\e173"}.glyphicon-floppy-remove:before{content:"\e174"}.glyphicon-floppy-save:before{content:"\e175"}.glyphicon-floppy-open:before{content:"\e176"}.glyphicon-credit-card:before{content:"\e177"}.glyphicon-transfer:before{content:"\e178"}.glyphicon-cutlery:before{content:"\e179"}.glyphicon-header:before{content:"\e180"}.glyphicon-compressed:before{content:"\e181"}.glyphicon-earphone:before{content:"\e182"}.glyphicon-phone-alt:before{content:"\e183"}.glyphicon-tower:before{content:"\e184"}.glyphicon-stats:before{content:"\e185"}.glyphicon-sd-video:before{content:"\e186"}.glyphicon-hd-video:before{content:"\e187"}.glyphicon-subtitles:before{content:"\e188"}.glyphicon-sound-stereo:before{content:"\e189"}.glyphicon-sound-dolby:before{content:"\e190"}.glyphicon-sound-5-1:before{content:"\e191"}.glyphicon-sound-6-1:before{content:"\e192"}.glyphicon-sound-7-1:before{content:"\e193"}.glyphicon-copyright-mark:before{content:"\e194"}.glyphicon-registration-mark:before{content:"\e195"}.glyphicon-cloud-download:before{content:"\e197"}.glyphicon-cloud-upload:before{content:"\e198"}.glyphicon-tree-conifer:before{content:"\e199"}.glyphicon-tree-deciduous:before{content:"\e200"}*{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}:before,:after{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}html{font-size:10px;-webkit-tap-highlight-color:rgba(0,0,0,0)}body{font-family:"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:14px;line-height:1.42857143;color:#333;background-color:#fff}input,button,select,textarea{font-family:inherit;font-size:inherit;line-height:inherit}a{color:#337ab7;text-decoration:none}a:hover,a:focus{color:#23527c;text-decoration:underline}a:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}figure{margin:0}img{vertical-align:middle}.img-responsive,.thumbnail>img,.thumbnail a>img,.carousel-inner>.item>img,.carousel-inner>.item>a>img{display:block;max-width:100%;height:auto}.img-rounded{border-radius:6px}.img-thumbnail{display:inline-block;max-width:100%;height:auto;padding:4px;line-height:1.42857143;background-color:#fff;border:1px solid #ddd;border-radius:4px;-webkit-transition:all .2s ease-in-out;-o-transition:all .2s ease-in-out;transition:all .2s ease-in-out}.img-circle{border-radius:50%}hr{margin-top:20px;margin-bottom:20px;border:0;border-top:1px solid #eee}.sr-only{position:absolute;width:1px;height:1px;padding:0;margin:-1px;overflow:hidden;clip:rect(0,0,0,0);border:0}.sr-only-focusable:active,.sr-only-focusable:focus{position:static;width:auto;height:auto;margin:0;overflow:visible;clip:auto}h1,h2,h3,h4,h5,h6,.h1,.h2,.h3,.h4,.h5,.h6{font-family:inherit;font-weight:500;line-height:1.1;color:inherit}h1 small,h2 small,h3 small,h4 small,h5 small,h6 small,.h1 small,.h2 small,.h3 small,.h4 small,.h5 small,.h6 small,h1 .small,h2 .small,h3 .small,h4 .small,h5 .small,h6 .small,.h1 .small,.h2 .small,.h3 .small,.h4 .small,.h5 .small,.h6 .small{font-weight:400;line-height:1;color:#777}h1,.h1,h2,.h2,h3,.h3{margin-top:20px;margin-bottom:10px}h1 small,.h1 small,h2 small,.h2 small,h3 small,.h3 small,h1 .small,.h1 .small,h2 .small,.h2 .small,h3 .small,.h3 .small{font-size:65%}h4,.h4,h5,.h5,h6,.h6{margin-top:10px;margin-bottom:10px}h4 small,.h4 small,h5 small,.h5 small,h6 small,.h6 small,h4 .small,.h4 .small,h5 .small,.h5 .small,h6 .small,.h6 .small{font-size:75%}h1,.h1{font-size:36px}h2,.h2{font-size:30px}h3,.h3{font-size:24px}h4,.h4{font-size:18px}h5,.h5{font-size:14px}h6,.h6{font-size:12px}p{margin:0 0 10px}.lead{margin-bottom:20px;font-size:16px;font-weight:300;line-height:1.4}@media (min-width:768px){.lead{font-size:21px}}small,.small{font-size:85%}mark,.mark{padding:.2em;background-color:#fcf8e3}.text-left{text-align:left}.text-right{text-align:right}.text-center{text-align:center}.text-justify{text-align:justify}.text-nowrap{white-space:nowrap}.text-lowercase{text-transform:lowercase}.text-uppercase{text-transform:uppercase}.text-capitalize{text-transform:capitalize}.text-muted{color:#777}.text-primary{color:#337ab7}a.text-primary:hover{color:#286090}.text-success{color:#3c763d}a.text-success:hover{color:#2b542c}.text-info{color:#31708f}a.text-info:hover{color:#245269}.text-warning{color:#8a6d3b}a.text-warning:hover{color:#66512c}.text-danger{color:#a94442}a.text-danger:hover{color:#843534}.bg-primary{color:#fff;background-color:#337ab7}a.bg-primary:hover{background-color:#286090}.bg-success{background-color:#dff0d8}a.bg-success:hover{background-color:#c1e2b3}.bg-info{background-color:#d9edf7}a.bg-info:hover{background-color:#afd9ee}.bg-warning{background-color:#fcf8e3}a.bg-warning:hover{background-color:#f7ecb5}.bg-danger{background-color:#f2dede}a.bg-danger:hover{background-color:#e4b9b9}.page-header{padding-bottom:9px;margin:40px 0 20px;border-bottom:1px solid #eee}ul,ol{margin-top:0;margin-bottom:10px}ul ul,ol ul,ul ol,ol ol{margin-bottom:0}.list-unstyled{padding-left:0;list-style:none}.list-inline{padding-left:0;margin-left:-5px;list-style:none}.list-inline>li{display:inline-block;padding-right:5px;padding-left:5px}dl{margin-top:0;margin-bottom:20px}dt,dd{line-height:1.42857143}dt{font-weight:700}dd{margin-left:0}@media (min-width:768px){.dl-horizontal dt{float:left;width:160px;overflow:hidden;clear:left;text-align:right;text-overflow:ellipsis;white-space:nowrap}.dl-horizontal dd{margin-left:180px}}abbr[title],abbr[data-original-title]{cursor:help;border-bottom:1px dotted #777}.initialism{font-size:90%;text-transform:uppercase}blockquote{padding:10px 20px;margin:0 0 20px;font-size:17.5px;border-left:5px solid #eee}blockquote p:last-child,blockquote ul:last-child,blockquote ol:last-child{margin-bottom:0}blockquote footer,blockquote small,blockquote .small{display:block;font-size:80%;line-height:1.42857143;color:#777}blockquote footer:before,blockquote small:before,blockquote .small:before{content:'\2014 \00A0'}.blockquote-reverse,blockquote.pull-right{padding-right:15px;padding-left:0;text-align:right;border-right:5px solid #eee;border-left:0}.blockquote-reverse footer:before,blockquote.pull-right footer:before,.blockquote-reverse small:before,blockquote.pull-right small:before,.blockquote-reverse .small:before,blockquote.pull-right .small:before{content:''}.blockquote-reverse footer:after,blockquote.pull-right footer:after,.blockquote-reverse small:after,blockquote.pull-right small:after,.blockquote-reverse .small:after,blockquote.pull-right .small:after{content:'\00A0 \2014'}address{margin-bottom:20px;font-style:normal;line-height:1.42857143}code,kbd,pre,samp{font-family:monospace}code{padding:2px 4px;font-size:90%;color:#c7254e;background-color:#f9f2f4;border-radius:4px}kbd{padding:2px 4px;font-size:90%;color:#fff;background-color:#333;border-radius:3px;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,.25);box-shadow:inset 0 -1px 0 rgba(0,0,0,.25)}kbd kbd{padding:0;font-size:100%;font-weight:700;-webkit-box-shadow:none;box-shadow:none}pre{display:block;padding:9.5px;margin:0 0 10px;font-size:13px;line-height:1.42857143;color:#333;word-break:break-all;word-wrap:break-word;background-color:#f5f5f5;border:1px solid #ccc;border-radius:4px}pre code{padding:0;font-size:inherit;color:inherit;white-space:pre-wrap;background-color:transparent;border-radius:0}.pre-scrollable{max-height:340px;overflow-y:scroll}.container{padding-right:15px;padding-left:15px;margin-right:auto;margin-left:auto}@media (min-width:768px){.container{width:750px}}@media (min-width:992px){.container{width:970px}}@media (min-width:1200px){.container{width:1170px}}.container-fluid{padding-right:15px;padding-left:15px;margin-right:auto;margin-left:auto}.row{margin-right:-15px;margin-left:-15px}.col-xs-1,.col-sm-1,.col-md-1,.col-lg-1,.col-xs-2,.col-sm-2,.col-md-2,.col-lg-2,.col-xs-3,.col-sm-3,.col-md-3,.col-lg-3,.col-xs-4,.col-sm-4,.col-md-4,.col-lg-4,.col-xs-5,.col-sm-5,.col-md-5,.col-lg-5,.col-xs-6,.col-sm-6,.col-md-6,.col-lg-6,.col-xs-7,.col-sm-7,.col-md-7,.col-lg-7,.col-xs-8,.col-sm-8,.col-md-8,.col-lg-8,.col-xs-9,.col-sm-9,.col-md-9,.col-lg-9,.col-xs-10,.col-sm-10,.col-md-10,.col-lg-10,.col-xs-11,.col-sm-11,.col-md-11,.col-lg-11,.col-xs-12,.col-sm-12,.col-md-12,.col-lg-12{position:relative;min-height:1px;padding-right:15px;padding-left:15px}.col-xs-1,.col-xs-2,.col-xs-3,.col-xs-4,.col-xs-5,.col-xs-6,.col-xs-7,.col-xs-8,.col-xs-9,.col-xs-10,.col-xs-11,.col-xs-12{float:left}.col-xs-12{width:100%}.col-xs-11{width:91.66666667%}.col-xs-10{width:83.33333333%}.col-xs-9{width:75%}.col-xs-8{width:66.66666667%}.col-xs-7{width:58.33333333%}.col-xs-6{width:50%}.col-xs-5{width:41.66666667%}.col-xs-4{width:33.33333333%}.col-xs-3{width:25%}.col-xs-2{width:16.66666667%}.col-xs-1{width:8.33333333%}.col-xs-pull-12{right:100%}.col-xs-pull-11{right:91.66666667%}.col-xs-pull-10{right:83.33333333%}.col-xs-pull-9{right:75%}.col-xs-pull-8{right:66.66666667%}.col-xs-pull-7{right:58.33333333%}.col-xs-pull-6{right:50%}.col-xs-pull-5{right:41.66666667%}.col-xs-pull-4{right:33.33333333%}.col-xs-pull-3{right:25%}.col-xs-pull-2{right:16.66666667%}.col-xs-pull-1{right:8.33333333%}.col-xs-pull-0{right:auto}.col-xs-push-12{left:100%}.col-xs-push-11{left:91.66666667%}.col-xs-push-10{left:83.33333333%}.col-xs-push-9{left:75%}.col-xs-push-8{left:66.66666667%}.col-xs-push-7{left:58.33333333%}.col-xs-push-6{left:50%}.col-xs-push-5{left:41.66666667%}.col-xs-push-4{left:33.33333333%}.col-xs-push-3{left:25%}.col-xs-push-2{left:16.66666667%}.col-xs-push-1{left:8.33333333%}.col-xs-push-0{left:auto}.col-xs-offset-12{margin-left:100%}.col-xs-offset-11{margin-left:91.66666667%}.col-xs-offset-10{margin-left:83.33333333%}.col-xs-offset-9{margin-left:75%}.col-xs-offset-8{margin-left:66.66666667%}.col-xs-offset-7{margin-left:58.33333333%}.col-xs-offset-6{margin-left:50%}.col-xs-offset-5{margin-left:41.66666667%}.col-xs-offset-4{margin-left:33.33333333%}.col-xs-offset-3{margin-left:25%}.col-xs-offset-2{margin-left:16.66666667%}.col-xs-offset-1{margin-left:8.33333333%}.col-xs-offset-0{margin-left:0}@media (min-width:768px){.col-sm-1,.col-sm-2,.col-sm-3,.col-sm-4,.col-sm-5,.col-sm-6,.col-sm-7,.col-sm-8,.col-sm-9,.col-sm-10,.col-sm-11,.col-sm-12{float:left}.col-sm-12{width:100%}.col-sm-11{width:91.66666667%}.col-sm-10{width:83.33333333%}.col-sm-9{width:75%}.col-sm-8{width:66.66666667%}.col-sm-7{width:58.33333333%}.col-sm-6{width:50%}.col-sm-5{width:41.66666667%}.col-sm-4{width:33.33333333%}.col-sm-3{width:25%}.col-sm-2{width:16.66666667%}.col-sm-1{width:8.33333333%}.col-sm-pull-12{right:100%}.col-sm-pull-11{right:91.66666667%}.col-sm-pull-10{right:83.33333333%}.col-sm-pull-9{right:75%}.col-sm-pull-8{right:66.66666667%}.col-sm-pull-7{right:58.33333333%}.col-sm-pull-6{right:50%}.col-sm-pull-5{right:41.66666667%}.col-sm-pull-4{right:33.33333333%}.col-sm-pull-3{right:25%}.col-sm-pull-2{right:16.66666667%}.col-sm-pull-1{right:8.33333333%}.col-sm-pull-0{right:auto}.col-sm-push-12{left:100%}.col-sm-push-11{left:91.66666667%}.col-sm-push-10{left:83.33333333%}.col-sm-push-9{left:75%}.col-sm-push-8{left:66.66666667%}.col-sm-push-7{left:58.33333333%}.col-sm-push-6{left:50%}.col-sm-push-5{left:41.66666667%}.col-sm-push-4{left:33.33333333%}.col-sm-push-3{left:25%}.col-sm-push-2{left:16.66666667%}.col-sm-push-1{left:8.33333333%}.col-sm-push-0{left:auto}.col-sm-offset-12{margin-left:100%}.col-sm-offset-11{margin-left:91.66666667%}.col-sm-offset-10{margin-left:83.33333333%}.col-sm-offset-9{margin-left:75%}.col-sm-offset-8{margin-left:66.66666667%}.col-sm-offset-7{margin-left:58.33333333%}.col-sm-offset-6{margin-left:50%}.col-sm-offset-5{margin-left:41.66666667%}.col-sm-offset-4{margin-left:33.33333333%}.col-sm-offset-3{margin-left:25%}.col-sm-offset-2{margin-left:16.66666667%}.col-sm-offset-1{margin-left:8.33333333%}.col-sm-offset-0{margin-left:0}}@media (min-width:992px){.col-md-1,.col-md-2,.col-md-3,.col-md-4,.col-md-5,.col-md-6,.col-md-7,.col-md-8,.col-md-9,.col-md-10,.col-md-11,.col-md-12{float:left}.col-md-12{width:100%}.col-md-11{width:91.66666667%}.col-md-10{width:83.33333333%}.col-md-9{width:75%}.col-md-8{width:66.66666667%}.col-md-7{width:58.33333333%}.col-md-6{width:50%}.col-md-5{width:41.66666667%}.col-md-4{width:33.33333333%}.col-md-3{width:25%}.col-md-2{width:16.66666667%}.col-md-1{width:8.33333333%}.col-md-pull-12{right:100%}.col-md-pull-11{right:91.66666667%}.col-md-pull-10{right:83.33333333%}.col-md-pull-9{right:75%}.col-md-pull-8{right:66.66666667%}.col-md-pull-7{right:58.33333333%}.col-md-pull-6{right:50%}.col-md-pull-5{right:41.66666667%}.col-md-pull-4{right:33.33333333%}.col-md-pull-3{right:25%}.col-md-pull-2{right:16.66666667%}.col-md-pull-1{right:8.33333333%}.col-md-pull-0{right:auto}.col-md-push-12{left:100%}.col-md-push-11{left:91.66666667%}.col-md-push-10{left:83.33333333%}.col-md-push-9{left:75%}.col-md-push-8{left:66.66666667%}.col-md-push-7{left:58.33333333%}.col-md-push-6{left:50%}.col-md-push-5{left:41.66666667%}.col-md-push-4{left:33.33333333%}.col-md-push-3{left:25%}.col-md-push-2{left:16.66666667%}.col-md-push-1{left:8.33333333%}.col-md-push-0{left:auto}.col-md-offset-12{margin-left:100%}.col-md-offset-11{margin-left:91.66666667%}.col-md-offset-10{margin-left:83.33333333%}.col-md-offset-9{margin-left:75%}.col-md-offset-8{margin-left:66.66666667%}.col-md-offset-7{margin-left:58.33333333%}.col-md-offset-6{margin-left:50%}.col-md-offset-5{margin-left:41.66666667%}.col-md-offset-4{margin-left:33.33333333%}.col-md-offset-3{margin-left:25%}.col-md-offset-2{margin-left:16.66666667%}.col-md-offset-1{margin-left:8.33333333%}.col-md-offset-0{margin-left:0}}@media (min-width:1200px){.col-lg-1,.col-lg-2,.col-lg-3,.col-lg-4,.col-lg-5,.col-lg-6,.col-lg-7,.col-lg-8,.col-lg-9,.col-lg-10,.col-lg-11,.col-lg-12{float:left}.col-lg-12{width:100%}.col-lg-11{width:91.66666667%}.col-lg-10{width:83.33333333%}.col-lg-9{width:75%}.col-lg-8{width:66.66666667%}.col-lg-7{width:58.33333333%}.col-lg-6{width:50%}.col-lg-5{width:41.66666667%}.col-lg-4{width:33.33333333%}.col-lg-3{width:25%}.col-lg-2{width:16.66666667%}.col-lg-1{width:8.33333333%}.col-lg-pull-12{right:100%}.col-lg-pull-11{right:91.66666667%}.col-lg-pull-10{right:83.33333333%}.col-lg-pull-9{right:75%}.col-lg-pull-8{right:66.66666667%}.col-lg-pull-7{right:58.33333333%}.col-lg-pull-6{right:50%}.col-lg-pull-5{right:41.66666667%}.col-lg-pull-4{right:33.33333333%}.col-lg-pull-3{right:25%}.col-lg-pull-2{right:16.66666667%}.col-lg-pull-1{right:8.33333333%}.col-lg-pull-0{right:auto}.col-lg-push-12{left:100%}.col-lg-push-11{left:91.66666667%}.col-lg-push-10{left:83.33333333%}.col-lg-push-9{left:75%}.col-lg-push-8{left:66.66666667%}.col-lg-push-7{left:58.33333333%}.col-lg-push-6{left:50%}.col-lg-push-5{left:41.66666667%}.col-lg-push-4{left:33.33333333%}.col-lg-push-3{left:25%}.col-lg-push-2{left:16.66666667%}.col-lg-push-1{left:8.33333333%}.col-lg-push-0{left:auto}.col-lg-offset-12{margin-left:100%}.col-lg-offset-11{margin-left:91.66666667%}.col-lg-offset-10{margin-left:83.33333333%}.col-lg-offset-9{margin-left:75%}.col-lg-offset-8{margin-left:66.66666667%}.col-lg-offset-7{margin-left:58.33333333%}.col-lg-offset-6{margin-left:50%}.col-lg-offset-5{margin-left:41.66666667%}.col-lg-offset-4{margin-left:33.33333333%}.col-lg-offset-3{margin-left:25%}.col-lg-offset-2{margin-left:16.66666667%}.col-lg-offset-1{margin-left:8.33333333%}.col-lg-offset-0{margin-left:0}}table{background-color:transparent}caption{padding-top:8px;padding-bottom:8px;color:#777;text-align:left}th{}.table{width:100%;max-width:100%;margin-bottom:20px}.table>thead>tr>th,.table>tbody>tr>th,.table>tfoot>tr>th,.table>thead>tr>td,.table>tbody>tr>td,.table>tfoot>tr>td{padding:8px;line-height:1.42857143;vertical-align:top;border-top:1px solid #ddd}.table>thead>tr>th{vertical-align:bottom;border-bottom:2px solid #ddd}.table>caption+thead>tr:first-child>th,.table>colgroup+thead>tr:first-child>th,.table>thead:first-child>tr:first-child>th,.table>caption+thead>tr:first-child>td,.table>colgroup+thead>tr:first-child>td,.table>thead:first-child>tr:first-child>td{border-top:0}.table>tbody+tbody{border-top:2px solid #ddd}.table .table{background-color:#fff}.table-condensed>thead>tr>th,.table-condensed>tbody>tr>th,.table-condensed>tfoot>tr>th,.table-condensed>thead>tr>td,.table-condensed>tbody>tr>td,.table-condensed>tfoot>tr>td{padding:5px}.table-bordered{border:1px solid #ddd}.table-bordered>thead>tr>th,.table-bordered>tbody>tr>th,.table-bordered>tfoot>tr>th,.table-bordered>thead>tr>td,.table-bordered>tbody>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #ddd}.table-bordered>thead>tr>th,.table-bordered>thead>tr>td{border-bottom-width:2px}.table-striped>tbody>tr:nth-child(odd){background-color:#f9f9f9}.table-hover>tbody>tr:hover{background-color:#f5f5f5}table col[class*=col-]{position:static;display:table-column;float:none}table td[class*=col-],table th[class*=col-]{position:static;display:table-cell;float:none}.table>thead>tr>td.active,.table>tbody>tr>td.active,.table>tfoot>tr>td.active,.table>thead>tr>th.active,.table>tbody>tr>th.active,.table>tfoot>tr>th.active,.table>thead>tr.active>td,.table>tbody>tr.active>td,.table>tfoot>tr.active>td,.table>thead>tr.active>th,.table>tbody>tr.active>th,.table>tfoot>tr.active>th{background-color:#f5f5f5}.table-hover>tbody>tr>td.active:hover,.table-hover>tbody>tr>th.active:hover,.table-hover>tbody>tr.active:hover>td,.table-hover>tbody>tr:hover>.active,.table-hover>tbody>tr.active:hover>th{background-color:#e8e8e8}.table>thead>tr>td.success,.table>tbody>tr>td.success,.table>tfoot>tr>td.success,.table>thead>tr>th.success,.table>tbody>tr>th.success,.table>tfoot>tr>th.success,.table>thead>tr.success>td,.table>tbody>tr.success>td,.table>tfoot>tr.success>td,.table>thead>tr.success>th,.table>tbody>tr.success>th,.table>tfoot>tr.success>th{background-color:#dff0d8}.table-hover>tbody>tr>td.success:hover,.table-hover>tbody>tr>th.success:hover,.table-hover>tbody>tr.success:hover>td,.table-hover>tbody>tr:hover>.success,.table-hover>tbody>tr.success:hover>th{background-color:#d0e9c6}.table>thead>tr>td.info,.table>tbody>tr>td.info,.table>tfoot>tr>td.info,.table>thead>tr>th.info,.table>tbody>tr>th.info,.table>tfoot>tr>th.info,.table>thead>tr.info>td,.table>tbody>tr.info>td,.table>tfoot>tr.info>td,.table>thead>tr.info>th,.table>tbody>tr.info>th,.table>tfoot>tr.info>th{background-color:#d9edf7}.table-hover>tbody>tr>td.info:hover,.table-hover>tbody>tr>th.info:hover,.table-hover>tbody>tr.info:hover>td,.table-hover>tbody>tr:hover>.info,.table-hover>tbody>tr.info:hover>th{background-color:#c4e3f3}.table>thead>tr>td.warning,.table>tbody>tr>td.warning,.table>tfoot>tr>td.warning,.table>thead>tr>th.warning,.table>tbody>tr>th.warning,.table>tfoot>tr>th.warning,.table>thead>tr.warning>td,.table>tbody>tr.warning>td,.table>tfoot>tr.warning>td,.table>thead>tr.warning>th,.table>tbody>tr.warning>th,.table>tfoot>tr.warning>th{background-color:#fcf8e3}.table-hover>tbody>tr>td.warning:hover,.table-hover>tbody>tr>th.warning:hover,.table-hover>tbody>tr.warning:hover>td,.table-hover>tbody>tr:hover>.warning,.table-hover>tbody>tr.warning:hover>th{background-color:#faf2cc}.table>thead>tr>td.danger,.table>tbody>tr>td.danger,.table>tfoot>tr>td.danger,.table>thead>tr>th.danger,.table>tbody>tr>th.danger,.table>tfoot>tr>th.danger,.table>thead>tr.danger>td,.table>tbody>tr.danger>td,.table>tfoot>tr.danger>td,.table>thead>tr.danger>th,.table>tbody>tr.danger>th,.table>tfoot>tr.danger>th{background-color:#f2dede}.table-hover>tbody>tr>td.danger:hover,.table-hover>tbody>tr>th.danger:hover,.table-hover>tbody>tr.danger:hover>td,.table-hover>tbody>tr:hover>.danger,.table-hover>tbody>tr.danger:hover>th{background-color:#ebcccc}.table-responsive{min-height:.01%;overflow-x:auto}@media screen and (max-width:767px){.table-responsive{width:100%;margin-bottom:15px;overflow-y:hidden;-ms-overflow-style:-ms-autohiding-scrollbar;border:1px solid #ddd}.table-responsive>.table{margin-bottom:0}.table-responsive>.table>thead>tr>th,.table-responsive>.table>tbody>tr>th,.table-responsive>.table>tfoot>tr>th,.table-responsive>.table>thead>tr>td,.table-responsive>.table>tbody>tr>td,.table-responsive>.table>tfoot>tr>td{white-space:nowrap}.table-responsive>.table-bordered{border:0}.table-responsive>.table-bordered>thead>tr>th:first-child,.table-responsive>.table-bordered>tbody>tr>th:first-child,.table-responsive>.table-bordered>tfoot>tr>th:first-child,.table-responsive>.table-bordered>thead>tr>td:first-child,.table-responsive>.table-bordered>tbody>tr>td:first-child,.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.table-responsive>.table-bordered>thead>tr>th:last-child,.table-responsive>.table-bordered>tbody>tr>th:last-child,.table-responsive>.table-bordered>tfoot>tr>th:last-child,.table-responsive>.table-bordered>thead>tr>td:last-child,.table-responsive>.table-bordered>tbody>tr>td:last-child,.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.table-responsive>.table-bordered>tbody>tr:last-child>th,.table-responsive>.table-bordered>tfoot>tr:last-child>th,.table-responsive>.table-bordered>tbody>tr:last-child>td,.table-responsive>.table-bordered>tfoot>tr:last-child>td{border-bottom:0}}fieldset{min-width:0;padding:0;margin:0;border:0}legend{display:block;width:100%;padding:0;margin-bottom:20px;font-size:21px;line-height:inherit;color:#333;border:0;border-bottom:1px solid #e5e5e5}label{display:inline-block;max-width:100%;margin-bottom:5px;font-weight:700}input[type=search]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}input[type=radio],input[type=checkbox]{margin:4px 0 0;margin-top:1px \9;line-height:normal}input[type=file]{display:block}input[type=range]{display:block;width:100%}select[multiple],select[size]{height:auto}input[type=file]:focus,input[type=radio]:focus,input[type=checkbox]:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}output{display:block;padding-top:7px;font-size:14px;line-height:1.42857143;color:#555}.form-control{display:block;width:100%;height:34px;padding:6px 12px;font-size:14px;line-height:1.42857143;color:#555;background-color:#fff;background-image:none;border:1px solid #ccc;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.075);box-shadow:inset 0 1px 1px rgba(0,0,0,.075);-webkit-transition:border-color ease-in-out .15s,-webkit-box-shadow ease-in-out .15s;-o-transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s;transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s}.form-control:focus{border-color:#66afe9;outline:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.075),0 0 8px rgba(102,175,233,.6);box-shadow:inset 0 1px 1px rgba(0,0,0,.075),0 0 8px rgba(102,175,233,.6)}.form-control::-moz-placeholder{color:#999;opacity:1}.form-control:-ms-input-placeholder{color:#999}.form-control::-webkit-input-placeholder{color:#999}.form-control[disabled],.form-control[readonly],fieldset[disabled] .form-control{cursor:not-allowed;background-color:#eee;opacity:1}textarea.form-control{height:auto}input[type=search]{-webkit-appearance:none}@media screen and (-webkit-min-device-pixel-ratio:0){input[type=date],input[type=time],input[type=datetime-local],input[type=month]{line-height:34px}input[type=date].input-sm,input[type=time].input-sm,input[type=datetime-local].input-sm,input[type=month].input-sm{line-height:30px}input[type=date].input-lg,input[type=time].input-lg,input[type=datetime-local].input-lg,input[type=month].input-lg{line-height:46px}}.form-group{margin-bottom:15px}.radio,.checkbox{position:relative;display:block;margin-top:10px;margin-bottom:10px}.radio label,.checkbox label{min-height:20px;padding-left:20px;margin-bottom:0;font-weight:400;cursor:pointer}.radio input[type=radio],.radio-inline input[type=radio],.checkbox input[type=checkbox],.checkbox-inline input[type=checkbox]{position:absolute;margin-top:4px \9;margin-left:-20px}.radio+.radio,.checkbox+.checkbox{margin-top:-5px}.radio-inline,.checkbox-inline{display:inline-block;padding-left:20px;margin-bottom:0;font-weight:400;vertical-align:middle;cursor:pointer}.radio-inline+.radio-inline,.checkbox-inline+.checkbox-inline{margin-top:0;margin-left:10px}input[type=radio][disabled],input[type=checkbox][disabled],input[type=radio].disabled,input[type=checkbox].disabled,fieldset[disabled] input[type=radio],fieldset[disabled] input[type=checkbox]{cursor:not-allowed}.radio-inline.disabled,.checkbox-inline.disabled,fieldset[disabled] .radio-inline,fieldset[disabled] .checkbox-inline{cursor:not-allowed}.radio.disabled label,.checkbox.disabled label,fieldset[disabled] .radio label,fieldset[disabled] .checkbox label{cursor:not-allowed}.form-control-static{padding-top:7px;padding-bottom:7px;margin-bottom:0}.form-control-static.input-lg,.form-control-static.input-sm{padding-right:0;padding-left:0}.input-sm,.form-group-sm .form-control{height:30px;padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}select.input-sm,select.form-group-sm .form-control{height:30px;line-height:30px}textarea.input-sm,textarea.form-group-sm .form-control,select[multiple].input-sm,select[multiple].form-group-sm .form-control{height:auto}.input-lg,.form-group-lg .form-control{height:46px;padding:10px 16px;font-size:18px;line-height:1.33;border-radius:6px}select.input-lg,select.form-group-lg .form-control{height:46px;line-height:46px}textarea.input-lg,textarea.form-group-lg .form-control,select[multiple].input-lg,select[multiple].form-group-lg .form-control{height:auto}.has-feedback{position:relative}.has-feedback .form-control{padding-right:42.5px}.form-control-feedback{position:absolute;top:0;right:0;z-index:2;display:block;width:34px;height:34px;line-height:34px;text-align:center;pointer-events:none}.input-lg+.form-control-feedback{width:46px;height:46px;line-height:46px}.input-sm+.form-control-feedback{width:30px;height:30px;line-height:30px}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success.radio label,.has-success.checkbox label,.has-success.radio-inline label,.has-success.checkbox-inline label{color:#3c763d}.has-success .form-control{border-color:#3c763d;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.075);box-shadow:inset 0 1px 1px rgba(0,0,0,.075)}.has-success .form-control:focus{border-color:#2b542c;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.075),0 0 6px #67b168;box-shadow:inset 0 1px 1px rgba(0,0,0,.075),0 0 6px #67b168}.has-success .input-group-addon{color:#3c763d;background-color:#dff0d8;border-color:#3c763d}.has-success .form-control-feedback{color:#3c763d}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning.radio label,.has-warning.checkbox label,.has-warning.radio-inline label,.has-warning.checkbox-inline label{color:#8a6d3b}.has-warning .form-control{border-color:#8a6d3b;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.075);box-shadow:inset 0 1px 1px rgba(0,0,0,.075)}.has-warning .form-control:focus{border-color:#66512c;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.075),0 0 6px #c0a16b;box-shadow:inset 0 1px 1px rgba(0,0,0,.075),0 0 6px #c0a16b}.has-warning .input-group-addon{color:#8a6d3b;background-color:#fcf8e3;border-color:#8a6d3b}.has-warning .form-control-feedback{color:#8a6d3b}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error.radio label,.has-error.checkbox label,.has-error.radio-inline label,.has-error.checkbox-inline label{color:#a94442}.has-error .form-control{border-color:#a94442;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.075);box-shadow:inset 0 1px 1px rgba(0,0,0,.075)}.has-error .form-control:focus{border-color:#843534;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.075),0 0 6px #ce8483;box-shadow:inset 0 1px 1px rgba(0,0,0,.075),0 0 6px #ce8483}.has-error .input-group-addon{color:#a94442;background-color:#f2dede;border-color:#a94442}.has-error .form-control-feedback{color:#a94442}.has-feedback label~.form-control-feedback{top:25px}.has-feedback label.sr-only~.form-control-feedback{top:0}.help-block{display:block;margin-top:5px;margin-bottom:10px;color:#737373}@media (min-width:768px){.form-inline .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.form-inline .form-control{display:inline-block;width:auto;vertical-align:middle}.form-inline .form-control-static{display:inline-block}.form-inline .input-group{display:inline-table;vertical-align:middle}.form-inline .input-group .input-group-addon,.form-inline .input-group .input-group-btn,.form-inline .input-group .form-control{width:auto}.form-inline .input-group>.form-control{width:100%}.form-inline .control-label{margin-bottom:0;vertical-align:middle}.form-inline .radio,.form-inline .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.form-inline .radio label,.form-inline .checkbox label{padding-left:0}.form-inline .radio input[type=radio],.form-inline .checkbox input[type=checkbox]{position:relative;margin-left:0}.form-inline .has-feedback .form-control-feedback{top:0}}.form-horizontal .radio,.form-horizontal .checkbox,.form-horizontal .radio-inline,.form-horizontal .checkbox-inline{padding-top:7px;margin-top:0;margin-bottom:0}.form-horizontal .radio,.form-horizontal .checkbox{min-height:27px}.form-horizontal .form-group{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.form-horizontal .control-label{padding-top:7px;margin-bottom:0;text-align:right}}.form-horizontal .has-feedback .form-control-feedback{right:15px}@media (min-width:768px){.form-horizontal .form-group-lg .control-label{padding-top:14.3px}}@media (min-width:768px){.form-horizontal .form-group-sm .control-label{padding-top:6px}}.btn{display:inline-block;padding:6px 12px;margin-bottom:0;font-size:14px;font-weight:400;line-height:1.42857143;text-align:center;white-space:nowrap;vertical-align:middle;-ms-touch-action:manipulation;touch-action:manipulation;cursor:pointer;-webkit-user-select:none;-moz-user-select:none;-ms-user-select:none;user-select:none;background-image:none;border:1px solid transparent;border-radius:4px}.btn:focus,.btn:active:focus,.btn.active:focus,.btn.focus,.btn:active.focus,.btn.active.focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}.btn:hover,.btn:focus,.btn.focus{color:#333;text-decoration:none}.btn:active,.btn.active{background-image:none;outline:0;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,.125);box-shadow:inset 0 3px 5px rgba(0,0,0,.125)}.btn.disabled,.btn[disabled],fieldset[disabled] .btn{pointer-events:none;cursor:not-allowed;filter:alpha(opacity=65);-webkit-box-shadow:none;box-shadow:none;opacity:.65}.btn-default{color:#333;background-color:#fff;border-color:#ccc}.btn-default:hover,.btn-default:focus,.btn-default.focus,.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{color:#333;background-color:#e6e6e6;border-color:#adadad}.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{background-image:none}.btn-default.disabled,.btn-default[disabled],fieldset[disabled] .btn-default,.btn-default.disabled:hover,.btn-default[disabled]:hover,fieldset[disabled] .btn-default:hover,.btn-default.disabled:focus,.btn-default[disabled]:focus,fieldset[disabled] .btn-default:focus,.btn-default.disabled.focus,.btn-default[disabled].focus,fieldset[disabled] .btn-default.focus,.btn-default.disabled:active,.btn-default[disabled]:active,fieldset[disabled] .btn-default:active,.btn-default.disabled.active,.btn-default[disabled].active,fieldset[disabled] .btn-default.active{background-color:#fff;border-color:#ccc}.btn-default .badge{color:#fff;background-color:#333}.btn-primary{color:#fff;background-color:#337ab7;border-color:#2e6da4}.btn-primary:hover,.btn-primary:focus,.btn-primary.focus,.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{color:#fff;background-color:#286090;border-color:#204d74}.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{background-image:none}.btn-primary.disabled,.btn-primary[disabled],fieldset[disabled] .btn-primary,.btn-primary.disabled:hover,.btn-primary[disabled]:hover,fieldset[disabled] .btn-primary:hover,.btn-primary.disabled:focus,.btn-primary[disabled]:focus,fieldset[disabled] .btn-primary:focus,.btn-primary.disabled.focus,.btn-primary[disabled].focus,fieldset[disabled] .btn-primary.focus,.btn-primary.disabled:active,.btn-primary[disabled]:active,fieldset[disabled] .btn-primary:active,.btn-primary.disabled.active,.btn-primary[disabled].active,fieldset[disabled] .btn-primary.active{background-color:#337ab7;border-color:#2e6da4}.btn-primary .badge{color:#337ab7;background-color:#fff}.btn-success{color:#fff;background-color:#5cb85c;border-color:#4cae4c}.btn-success:hover,.btn-success:focus,.btn-success.focus,.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{color:#fff;background-color:#449d44;border-color:#398439}.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{background-image:none}.btn-success.disabled,.btn-success[disabled],fieldset[disabled] .btn-success,.btn-success.disabled:hover,.btn-success[disabled]:hover,fieldset[disabled] .btn-success:hover,.btn-success.disabled:focus,.btn-success[disabled]:focus,fieldset[disabled] .btn-success:focus,.btn-success.disabled.focus,.btn-success[disabled].focus,fieldset[disabled] .btn-success.focus,.btn-success.disabled:active,.btn-success[disabled]:active,fieldset[disabled] .btn-success:active,.btn-success.disabled.active,.btn-success[disabled].active,fieldset[disabled] .btn-success.active{background-color:#5cb85c;border-color:#4cae4c}.btn-success .badge{color:#5cb85c;background-color:#fff}.btn-info{color:#fff;background-color:#5bc0de;border-color:#46b8da}.btn-info:hover,.btn-info:focus,.btn-info.focus,.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{color:#fff;background-color:#31b0d5;border-color:#269abc}.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{background-image:none}.btn-info.disabled,.btn-info[disabled],fieldset[disabled] .btn-info,.btn-info.disabled:hover,.btn-info[disabled]:hover,fieldset[disabled] .btn-info:hover,.btn-info.disabled:focus,.btn-info[disabled]:focus,fieldset[disabled] .btn-info:focus,.btn-info.disabled.focus,.btn-info[disabled].focus,fieldset[disabled] .btn-info.focus,.btn-info.disabled:active,.btn-info[disabled]:active,fieldset[disabled] .btn-info:active,.btn-info.disabled.active,.btn-info[disabled].active,fieldset[disabled] .btn-info.active{background-color:#5bc0de;border-color:#46b8da}.btn-info .badge{color:#5bc0de;background-color:#fff}.btn-warning{color:#fff;background-color:#f0ad4e;border-color:#eea236}.btn-warning:hover,.btn-warning:focus,.btn-warning.focus,.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{color:#fff;background-color:#ec971f;border-color:#d58512}.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{background-image:none}.btn-warning.disabled,.btn-warning[disabled],fieldset[disabled] .btn-warning,.btn-warning.disabled:hover,.btn-warning[disabled]:hover,fieldset[disabled] .btn-warning:hover,.btn-warning.disabled:focus,.btn-warning[disabled]:focus,fieldset[disabled] .btn-warning:focus,.btn-warning.disabled.focus,.btn-warning[disabled].focus,fieldset[disabled] .btn-warning.focus,.btn-warning.disabled:active,.btn-warning[disabled]:active,fieldset[disabled] .btn-warning:active,.btn-warning.disabled.active,.btn-warning[disabled].active,fieldset[disabled] .btn-warning.active{background-color:#f0ad4e;border-color:#eea236}.btn-warning .badge{color:#f0ad4e;background-color:#fff}.btn-danger{color:#fff;background-color:#d9534f;border-color:#d43f3a}.btn-danger:hover,.btn-danger:focus,.btn-danger.focus,.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{color:#fff;background-color:#c9302c;border-color:#ac2925}.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{background-image:none}.btn-danger.disabled,.btn-danger[disabled],fieldset[disabled] .btn-danger,.btn-danger.disabled:hover,.btn-danger[disabled]:hover,fieldset[disabled] .btn-danger:hover,.btn-danger.disabled:focus,.btn-danger[disabled]:focus,fieldset[disabled] .btn-danger:focus,.btn-danger.disabled.focus,.btn-danger[disabled].focus,fieldset[disabled] .btn-danger.focus,.btn-danger.disabled:active,.btn-danger[disabled]:active,fieldset[disabled] .btn-danger:active,.btn-danger.disabled.active,.btn-danger[disabled].active,fieldset[disabled] .btn-danger.active{background-color:#d9534f;border-color:#d43f3a}.btn-danger .badge{color:#d9534f;background-color:#fff}.btn-link{font-weight:400;color:#337ab7;border-radius:0}.btn-link,.btn-link:active,.btn-link.active,.btn-link[disabled],fieldset[disabled] .btn-link{background-color:transparent;-webkit-box-shadow:none;box-shadow:none}.btn-link,.btn-link:hover,.btn-link:focus,.btn-link:active{border-color:transparent}.btn-link:hover,.btn-link:focus{color:#23527c;text-decoration:underline;background-color:transparent}.btn-link[disabled]:hover,fieldset[disabled] .btn-link:hover,.btn-link[disabled]:focus,fieldset[disabled] .btn-link:focus{color:#777;text-decoration:none}.btn-lg,.btn-group-lg>.btn{padding:10px 16px;font-size:18px;line-height:1.33;border-radius:6px}.btn-sm,.btn-group-sm>.btn{padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}.btn-xs,.btn-group-xs>.btn{padding:1px 5px;font-size:12px;line-height:1.5;border-radius:3px}.btn-block{display:block;width:100%}.btn-block+.btn-block{margin-top:5px}input[type=submit].btn-block,input[type=reset].btn-block,input[type=button].btn-block{width:100%}.fade{opacity:0;-webkit-transition:opacity .15s linear;-o-transition:opacity .15s linear;transition:opacity .15s linear}.fade.in{opacity:1}.collapse{display:none;visibility:hidden}.collapse.in{display:block;visibility:visible}tr.collapse.in{display:table-row}tbody.collapse.in{display:table-row-group}.collapsing{position:relative;height:0;overflow:hidden;-webkit-transition-timing-function:ease;-o-transition-timing-function:ease;transition-timing-function:ease;-webkit-transition-duration:.35s;-o-transition-duration:.35s;transition-duration:.35s;-webkit-transition-property:height,visibility;-o-transition-property:height,visibility;transition-property:height,visibility}.caret{display:inline-block;width:0;height:0;margin-left:2px;vertical-align:middle;border-top:4px solid;border-right:4px solid transparent;border-left:4px solid transparent}.dropdown{position:relative}.dropdown-toggle:focus{outline:0}.dropdown-menu{position:absolute;top:100%;left:0;z-index:1000;display:none;float:left;min-width:160px;padding:5px 0;margin:2px 0 0;font-size:14px;text-align:left;list-style:none;background-color:#fff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #ccc;border:1px solid rgba(0,0,0,.15);border-radius:4px;-webkit-box-shadow:0 6px 12px rgba(0,0,0,.175);box-shadow:0 6px 12px rgba(0,0,0,.175)}.dropdown-menu.pull-right{right:0;left:auto}.dropdown-menu .divider{height:1px;margin:9px 0;overflow:hidden;background-color:#e5e5e5}.dropdown-menu>li>a{display:block;padding:3px 20px;clear:both;font-weight:400;line-height:1.42857143;color:#333;white-space:nowrap}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{color:#262626;text-decoration:none;background-color:#f5f5f5}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{color:#fff;text-decoration:none;background-color:#337ab7;outline:0}.dropdown-menu>.disabled>a,.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{color:#777}.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{text-decoration:none;cursor:not-allowed;background-color:transparent;background-image:none;filter:progid:DXImageTransform.Microsoft.gradient(enabled=false)}.open>.dropdown-menu{display:block}.open>a{outline:0}.dropdown-menu-right{right:0;left:auto}.dropdown-menu-left{right:auto;left:0}.dropdown-header{display:block;padding:3px 20px;font-size:12px;line-height:1.42857143;color:#777;white-space:nowrap}.dropdown-backdrop{position:fixed;top:0;right:0;bottom:0;left:0;z-index:990}.pull-right>.dropdown-menu{right:0;left:auto}.dropup .caret,.navbar-fixed-bottom .dropdown .caret{content:"";border-top:0;border-bottom:4px solid}.dropup .dropdown-menu,.navbar-fixed-bottom .dropdown .dropdown-menu{top:auto;bottom:100%;margin-bottom:1px}@media (min-width:768px){.navbar-right .dropdown-menu{right:0;left:auto}.navbar-right .dropdown-menu-left{right:auto;left:0}}.btn-group,.btn-group-vertical{position:relative;display:inline-block;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;float:left}.btn-group>.btn:hover,.btn-group-vertical>.btn:hover,.btn-group>.btn:focus,.btn-group-vertical>.btn:focus,.btn-group>.btn:active,.btn-group-vertical>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn.active{z-index:2}.btn-group .btn+.btn,.btn-group .btn+.btn-group,.btn-group .btn-group+.btn,.btn-group .btn-group+.btn-group{margin-left:-1px}.btn-toolbar{margin-left:-5px}.btn-toolbar .btn-group,.btn-toolbar .input-group{float:left}.btn-toolbar>.btn,.btn-toolbar>.btn-group,.btn-toolbar>.input-group{margin-left:5px}.btn-group>.btn:not(:first-child):not(:last-child):not(.dropdown-toggle){border-radius:0}.btn-group>.btn:first-child{margin-left:0}.btn-group>.btn:first-child:not(:last-child):not(.dropdown-toggle){border-top-right-radius:0;border-bottom-right-radius:0}.btn-group>.btn:last-child:not(:first-child),.btn-group>.dropdown-toggle:not(:first-child){border-top-left-radius:0;border-bottom-left-radius:0}.btn-group>.btn-group{float:left}.btn-group>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group>.btn-group:first-child>.btn:last-child,.btn-group>.btn-group:first-child>.dropdown-toggle{border-top-right-radius:0;border-bottom-right-radius:0}.btn-group>.btn-group:last-child>.btn:first-child{border-top-left-radius:0;border-bottom-left-radius:0}.btn-group .dropdown-toggle:active,.btn-group.open .dropdown-toggle{outline:0}.btn-group>.btn+.dropdown-toggle{padding-right:8px;padding-left:8px}.btn-group>.btn-lg+.dropdown-toggle{padding-right:12px;padding-left:12px}.btn-group.open .dropdown-toggle{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,.125);box-shadow:inset 0 3px 5px rgba(0,0,0,.125)}.btn-group.open .dropdown-toggle.btn-link{-webkit-box-shadow:none;box-shadow:none}.btn .caret{margin-left:0}.btn-lg .caret{border-width:5px 5px 0;border-bottom-width:0}.dropup .btn-lg .caret{border-width:0 5px 5px}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group,.btn-group-vertical>.btn-group>.btn{display:block;float:none;width:100%;max-width:100%}.btn-group-vertical>.btn-group>.btn{float:none}.btn-group-vertical>.btn+.btn,.btn-group-vertical>.btn+.btn-group,.btn-group-vertical>.btn-group+.btn,.btn-group-vertical>.btn-group+.btn-group{margin-top:-1px;margin-left:0}.btn-group-vertical>.btn:not(:first-child):not(:last-child){border-radius:0}.btn-group-vertical>.btn:first-child:not(:last-child){border-top-right-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn:last-child:not(:first-child){border-top-left-radius:0;border-top-right-radius:0;border-bottom-left-radius:4px}.btn-group-vertical>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group-vertical>.btn-group:first-child:not(:last-child)>.btn:last-child,.btn-group-vertical>.btn-group:first-child:not(:last-child)>.dropdown-toggle{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn-group:last-child:not(:first-child)>.btn:first-child{border-top-left-radius:0;border-top-right-radius:0}.btn-group-justified{display:table;width:100%;table-layout:fixed;border-collapse:separate}.btn-group-justified>.btn,.btn-group-justified>.btn-group{display:table-cell;float:none;width:1%}.btn-group-justified>.btn-group .btn{width:100%}.btn-group-justified>.btn-group .dropdown-menu{left:auto}[data-toggle=buttons]>.btn input[type=radio],[data-toggle=buttons]>.btn-group>.btn input[type=radio],[data-toggle=buttons]>.btn input[type=checkbox],[data-toggle=buttons]>.btn-group>.btn input[type=checkbox]{position:absolute;clip:rect(0,0,0,0);pointer-events:none}.input-group{position:relative;display:table;border-collapse:separate}.input-group[class*=col-]{float:none;padding-right:0;padding-left:0}.input-group .form-control{position:relative;z-index:2;float:left;width:100%;margin-bottom:0}.input-group-lg>.form-control,.input-group-lg>.input-group-addon,.input-group-lg>.input-group-btn>.btn{height:46px;padding:10px 16px;font-size:18px;line-height:1.33;border-radius:6px}select.input-group-lg>.form-control,select.input-group-lg>.input-group-addon,select.input-group-lg>.input-group-btn>.btn{height:46px;line-height:46px}textarea.input-group-lg>.form-control,textarea.input-group-lg>.input-group-addon,textarea.input-group-lg>.input-group-btn>.btn,select[multiple].input-group-lg>.form-control,select[multiple].input-group-lg>.input-group-addon,select[multiple].input-group-lg>.input-group-btn>.btn{height:auto}.input-group-sm>.form-control,.input-group-sm>.input-group-addon,.input-group-sm>.input-group-btn>.btn{height:30px;padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}select.input-group-sm>.form-control,select.input-group-sm>.input-group-addon,select.input-group-sm>.input-group-btn>.btn{height:30px;line-height:30px}textarea.input-group-sm>.form-control,textarea.input-group-sm>.input-group-addon,textarea.input-group-sm>.input-group-btn>.btn,select[multiple].input-group-sm>.form-control,select[multiple].input-group-sm>.input-group-addon,select[multiple].input-group-sm>.input-group-btn>.btn{height:auto}.input-group-addon,.input-group-btn,.input-group .form-control{display:table-cell}.input-group-addon:not(:first-child):not(:last-child),.input-group-btn:not(:first-child):not(:last-child),.input-group .form-control:not(:first-child):not(:last-child){border-radius:0}.input-group-addon,.input-group-btn{width:1%;white-space:nowrap;vertical-align:middle}.input-group-addon{padding:6px 12px;font-size:14px;font-weight:400;line-height:1;color:#555;text-align:center;background-color:#eee;border:1px solid #ccc;border-radius:4px}.input-group-addon.input-sm{padding:5px 10px;font-size:12px;border-radius:3px}.input-group-addon.input-lg{padding:10px 16px;font-size:18px;border-radius:6px}.input-group-addon input[type=radio],.input-group-addon input[type=checkbox]{margin-top:0}.input-group .form-control:first-child,.input-group-addon:first-child,.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group>.btn,.input-group-btn:first-child>.dropdown-toggle,.input-group-btn:last-child>.btn:not(:last-child):not(.dropdown-toggle),.input-group-btn:last-child>.btn-group:not(:last-child)>.btn{border-top-right-radius:0;border-bottom-right-radius:0}.input-group-addon:first-child{border-right:0}.input-group .form-control:last-child,.input-group-addon:last-child,.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group>.btn,.input-group-btn:last-child>.dropdown-toggle,.input-group-btn:first-child>.btn:not(:first-child),.input-group-btn:first-child>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-bottom-left-radius:0}.input-group-addon:last-child{border-left:0}.input-group-btn{position:relative;font-size:0;white-space:nowrap}.input-group-btn>.btn{position:relative}.input-group-btn>.btn+.btn{margin-left:-1px}.input-group-btn>.btn:hover,.input-group-btn>.btn:focus,.input-group-btn>.btn:active{z-index:2}.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group{margin-right:-1px}.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group{margin-left:-1px}.nav{padding-left:0;margin-bottom:0;list-style:none}.nav>li{position:relative;display:block}.nav>li>a{position:relative;display:block;padding:10px 15px}.nav>li>a:hover,.nav>li>a:focus{text-decoration:none;background-color:#eee}.nav>li.disabled>a{color:#777}.nav>li.disabled>a:hover,.nav>li.disabled>a:focus{color:#777;text-decoration:none;cursor:not-allowed;background-color:transparent}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{background-color:#eee;border-color:#337ab7}.nav .nav-divider{height:1px;margin:9px 0;overflow:hidden;background-color:#e5e5e5}.nav>li>a>img{max-width:none}.nav-tabs{border-bottom:1px solid #ddd}.nav-tabs>li{float:left;margin-bottom:-1px}.nav-tabs>li>a{margin-right:2px;line-height:1.42857143;border:1px solid transparent;border-radius:4px 4px 0 0}.nav-tabs>li>a:hover{border-color:#eee #eee #ddd}.nav-tabs>li.active>a,.nav-tabs>li.active>a:hover,.nav-tabs>li.active>a:focus{color:#555;cursor:default;background-color:#fff;border:1px solid #ddd;border-bottom-color:transparent}.nav-tabs.nav-justified{width:100%;border-bottom:0}.nav-tabs.nav-justified>li{float:none}.nav-tabs.nav-justified>li>a{margin-bottom:5px;text-align:center}.nav-tabs.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-tabs.nav-justified>li{display:table-cell;width:1%}.nav-tabs.nav-justified>li>a{margin-bottom:0}}.nav-tabs.nav-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border:1px solid #ddd}@media (min-width:768px){.nav-tabs.nav-justified>li>a{border-bottom:1px solid #ddd;border-radius:4px 4px 0 0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border-bottom-color:#fff}}.nav-pills>li{float:left}.nav-pills>li>a{border-radius:4px}.nav-pills>li+li{margin-left:2px}.nav-pills>li.active>a,.nav-pills>li.active>a:hover,.nav-pills>li.active>a:focus{color:#fff;background-color:#337ab7}.nav-stacked>li{float:none}.nav-stacked>li+li{margin-top:2px;margin-left:0}.nav-justified{width:100%}.nav-justified>li{float:none}.nav-justified>li>a{margin-bottom:5px;text-align:center}.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-justified>li{display:table-cell;width:1%}.nav-justified>li>a{margin-bottom:0}}.nav-tabs-justified{border-bottom:0}.nav-tabs-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border:1px solid #ddd}@media (min-width:768px){.nav-tabs-justified>li>a{border-bottom:1px solid #ddd;border-radius:4px 4px 0 0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border-bottom-color:#fff}}.tab-content>.tab-pane{display:none;visibility:hidden}.tab-content>.active{display:block;visibility:visible}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-left-radius:0;border-top-right-radius:0}.navbar{position:relative;min-height:50px;margin-bottom:20px;border:1px solid transparent}@media (min-width:768px){.navbar{border-radius:4px}}@media (min-width:768px){.navbar-header{float:left}}.navbar-collapse{padding-right:15px;padding-left:15px;overflow-x:visible;-webkit-overflow-scrolling:touch;border-top:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,.1);box-shadow:inset 0 1px 0 rgba(255,255,255,.1)}.navbar-collapse.in{overflow-y:auto}@media (min-width:768px){.navbar-collapse{width:auto;border-top:0;-webkit-box-shadow:none;box-shadow:none}.navbar-collapse.collapse{display:block!important;height:auto!important;padding-bottom:0;overflow:visible!important;visibility:visible!important}.navbar-collapse.in{overflow-y:visible}.navbar-fixed-top .navbar-collapse,.navbar-static-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{padding-right:0;padding-left:0}}.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:340px}@media (max-device-width:480px) and (orientation:landscape){.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:200px}}.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:0;margin-left:0}}.navbar-static-top{z-index:1000;border-width:0 0 1px}@media (min-width:768px){.navbar-static-top{border-radius:0}}.navbar-fixed-top,.navbar-fixed-bottom{position:fixed;right:0;left:0;z-index:1030}@media (min-width:768px){.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}}.navbar-fixed-top{top:0;border-width:0 0 1px}.navbar-fixed-bottom{bottom:0;margin-bottom:0;border-width:1px 0 0}.navbar-brand{float:left;height:50px;padding:15px 15px;font-size:18px;line-height:20px}.navbar-brand:hover,.navbar-brand:focus{text-decoration:none}.navbar-brand>img{display:block}@media (min-width:768px){.navbar>.container .navbar-brand,.navbar>.container-fluid .navbar-brand{margin-left:-15px}}.navbar-toggle{position:relative;float:right;padding:9px 10px;margin-top:8px;margin-right:15px;margin-bottom:8px;background-color:transparent;background-image:none;border:1px solid transparent;border-radius:4px}.navbar-toggle:focus{outline:0}.navbar-toggle .icon-bar{display:block;width:22px;height:2px;border-radius:1px}.navbar-toggle .icon-bar+.icon-bar{margin-top:4px}@media (min-width:768px){.navbar-toggle{display:none}}.navbar-nav{margin:7.5px -15px}.navbar-nav>li>a{padding-top:10px;padding-bottom:10px;line-height:20px}@media (max-width:767px){.navbar-nav .open .dropdown-menu{position:static;float:none;width:auto;margin-top:0;background-color:transparent;border:0;-webkit-box-shadow:none;box-shadow:none}.navbar-nav .open .dropdown-menu>li>a,.navbar-nav .open .dropdown-menu .dropdown-header{padding:5px 15px 5px 25px}.navbar-nav .open .dropdown-menu>li>a{line-height:20px}.navbar-nav .open .dropdown-menu>li>a:hover,.navbar-nav .open .dropdown-menu>li>a:focus{background-image:none}}@media (min-width:768px){.navbar-nav{float:left;margin:0}.navbar-nav>li{float:left}.navbar-nav>li>a{padding-top:15px;padding-bottom:15px}}.navbar-form{padding:10px 15px;margin-top:8px;margin-right:-15px;margin-bottom:8px;margin-left:-15px;border-top:1px solid transparent;border-bottom:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,.1),0 1px 0 rgba(255,255,255,.1);box-shadow:inset 0 1px 0 rgba(255,255,255,.1),0 1px 0 rgba(255,255,255,.1)}@media (min-width:768px){.navbar-form .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.navbar-form .form-control{display:inline-block;width:auto;vertical-align:middle}.navbar-form .form-control-static{display:inline-block}.navbar-form .input-group{display:inline-table;vertical-align:middle}.navbar-form .input-group .input-group-addon,.navbar-form .input-group .input-group-btn,.navbar-form .input-group .form-control{width:auto}.navbar-form .input-group>.form-control{width:100%}.navbar-form .control-label{margin-bottom:0;vertical-align:middle}.navbar-form .radio,.navbar-form .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.navbar-form .radio label,.navbar-form .checkbox label{padding-left:0}.navbar-form .radio input[type=radio],.navbar-form .checkbox input[type=checkbox]{position:relative;margin-left:0}.navbar-form .has-feedback .form-control-feedback{top:0}}@media (max-width:767px){.navbar-form .form-group{margin-bottom:5px}.navbar-form .form-group:last-child{margin-bottom:0}}@media (min-width:768px){.navbar-form{width:auto;padding-top:0;padding-bottom:0;margin-right:0;margin-left:0;border:0;-webkit-box-shadow:none;box-shadow:none}}.navbar-nav>li>.dropdown-menu{margin-top:0;border-top-left-radius:0;border-top-right-radius:0}.navbar-fixed-bottom .navbar-nav>li>.dropdown-menu{border-top-left-radius:4px;border-top-right-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.navbar-btn{margin-top:8px;margin-bottom:8px}.navbar-btn.btn-sm{margin-top:10px;margin-bottom:10px}.navbar-btn.btn-xs{margin-top:14px;margin-bottom:14px}.navbar-text{margin-top:15px;margin-bottom:15px}@media (min-width:768px){.navbar-text{float:left;margin-right:15px;margin-left:15px}}@media (min-width:768px){.navbar-left{float:left!important}.navbar-right{float:right!important;margin-right:-15px}.navbar-right~.navbar-right{margin-right:0}}.navbar-default{background-color:#f8f8f8;border-color:#e7e7e7}.navbar-default .navbar-brand{color:#777}.navbar-default .navbar-brand:hover,.navbar-default .navbar-brand:focus{color:#5e5e5e;background-color:transparent}.navbar-default .navbar-text{color:#777}.navbar-default .navbar-nav>li>a{color:#777}.navbar-default .navbar-nav>li>a:hover,.navbar-default .navbar-nav>li>a:focus{color:#333;background-color:transparent}.navbar-default .navbar-nav>.active>a,.navbar-default .navbar-nav>.active>a:hover,.navbar-default .navbar-nav>.active>a:focus{color:#555;background-color:#e7e7e7}.navbar-default .navbar-nav>.disabled>a,.navbar-default .navbar-nav>.disabled>a:hover,.navbar-default .navbar-nav>.disabled>a:focus{color:#ccc;background-color:transparent}.navbar-default .navbar-toggle{border-color:#ddd}.navbar-default .navbar-toggle:hover,.navbar-default .navbar-toggle:focus{background-color:#ddd}.navbar-default .navbar-toggle .icon-bar{background-color:#888}.navbar-default .navbar-collapse,.navbar-default .navbar-form{border-color:#e7e7e7}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.open>a:hover,.navbar-default .navbar-nav>.open>a:focus{color:#555;background-color:#e7e7e7}@media (max-width:767px){.navbar-default .navbar-nav .open .dropdown-menu>li>a{color:#777}.navbar-default .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>li>a:focus{color:#333;background-color:transparent}.navbar-default .navbar-nav .open .dropdown-menu>.active>a,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:focus{color:#555;background-color:#e7e7e7}.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#ccc;background-color:transparent}}.navbar-default .navbar-link{color:#777}.navbar-default .navbar-link:hover{color:#333}.navbar-default .btn-link{color:#777}.navbar-default .btn-link:hover,.navbar-default .btn-link:focus{color:#333}.navbar-default .btn-link[disabled]:hover,fieldset[disabled] .navbar-default .btn-link:hover,.navbar-default .btn-link[disabled]:focus,fieldset[disabled] .navbar-default .btn-link:focus{color:#ccc}.navbar-inverse{background-color:#222;border-color:#080808}.navbar-inverse .navbar-brand{color:#9d9d9d}.navbar-inverse .navbar-brand:hover,.navbar-inverse .navbar-brand:focus{color:#fff;background-color:transparent}.navbar-inverse .navbar-text{color:#9d9d9d}.navbar-inverse .navbar-nav>li>a{color:#9d9d9d}.navbar-inverse .navbar-nav>li>a:hover,.navbar-inverse .navbar-nav>li>a:focus{color:#fff;background-color:transparent}.navbar-inverse .navbar-nav>.active>a,.navbar-inverse .navbar-nav>.active>a:hover,.navbar-inverse .navbar-nav>.active>a:focus{color:#fff;background-color:#080808}.navbar-inverse .navbar-nav>.disabled>a,.navbar-inverse .navbar-nav>.disabled>a:hover,.navbar-inverse .navbar-nav>.disabled>a:focus{color:#444;background-color:transparent}.navbar-inverse .navbar-toggle{border-color:#333}.navbar-inverse .navbar-toggle:hover,.navbar-inverse .navbar-toggle:focus{background-color:#333}.navbar-inverse .navbar-toggle .icon-bar{background-color:#fff}.navbar-inverse .navbar-collapse,.navbar-inverse .navbar-form{border-color:#101010}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.open>a:hover,.navbar-inverse .navbar-nav>.open>a:focus{color:#fff;background-color:#080808}@media (max-width:767px){.navbar-inverse .navbar-nav .open .dropdown-menu>.dropdown-header{border-color:#080808}.navbar-inverse .navbar-nav .open .dropdown-menu .divider{background-color:#080808}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a{color:#9d9d9d}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:focus{color:#fff;background-color:transparent}.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:focus{color:#fff;background-color:#080808}.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#444;background-color:transparent}}.navbar-inverse .navbar-link{color:#9d9d9d}.navbar-inverse .navbar-link:hover{color:#fff}.navbar-inverse .btn-link{color:#9d9d9d}.navbar-inverse .btn-link:hover,.navbar-inverse .btn-link:focus{color:#fff}.navbar-inverse .btn-link[disabled]:hover,fieldset[disabled] .navbar-inverse .btn-link:hover,.navbar-inverse .btn-link[disabled]:focus,fieldset[disabled] .navbar-inverse .btn-link:focus{color:#444}.breadcrumb{padding:8px 15px;margin-bottom:20px;list-style:none;background-color:#f5f5f5;border-radius:4px}.breadcrumb>li{display:inline-block}.breadcrumb>li+li:before{padding:0 5px;color:#ccc;content:"/\00a0"}.breadcrumb>.active{color:#777}.pagination{display:inline-block;padding-left:0;margin:20px 0;border-radius:4px}.pagination>li{display:inline}.pagination>li>a,.pagination>li>span{position:relative;float:left;padding:6px 12px;margin-left:-1px;line-height:1.42857143;color:#337ab7;text-decoration:none;background-color:#fff;border:1px solid #ddd}.pagination>li:first-child>a,.pagination>li:first-child>span{margin-left:0;border-top-left-radius:4px;border-bottom-left-radius:4px}.pagination>li:last-child>a,.pagination>li:last-child>span{border-top-right-radius:4px;border-bottom-right-radius:4px}.pagination>li>a:hover,.pagination>li>span:hover,.pagination>li>a:focus,.pagination>li>span:focus{color:#23527c;background-color:#eee;border-color:#ddd}.pagination>.active>a,.pagination>.active>span,.pagination>.active>a:hover,.pagination>.active>span:hover,.pagination>.active>a:focus,.pagination>.active>span:focus{z-index:2;color:#fff;cursor:default;background-color:#337ab7;border-color:#337ab7}.pagination>.disabled>span,.pagination>.disabled>span:hover,.pagination>.disabled>span:focus,.pagination>.disabled>a,.pagination>.disabled>a:hover,.pagination>.disabled>a:focus{color:#777;cursor:not-allowed;background-color:#fff;border-color:#ddd}.pagination-lg>li>a,.pagination-lg>li>span{padding:10px 16px;font-size:18px}.pagination-lg>li:first-child>a,.pagination-lg>li:first-child>span{border-top-left-radius:6px;border-bottom-left-radius:6px}.pagination-lg>li:last-child>a,.pagination-lg>li:last-child>span{border-top-right-radius:6px;border-bottom-right-radius:6px}.pagination-sm>li>a,.pagination-sm>li>span{padding:5px 10px;font-size:12px}.pagination-sm>li:first-child>a,.pagination-sm>li:first-child>span{border-top-left-radius:3px;border-bottom-left-radius:3px}.pagination-sm>li:last-child>a,.pagination-sm>li:last-child>span{border-top-right-radius:3px;border-bottom-right-radius:3px}.pager{padding-left:0;margin:20px 0;text-align:center;list-style:none}.pager li{display:inline}.pager li>a,.pager li>span{display:inline-block;padding:5px 14px;background-color:#fff;border:1px solid #ddd;border-radius:15px}.pager li>a:hover,.pager li>a:focus{text-decoration:none;background-color:#eee}.pager .next>a,.pager .next>span{float:right}.pager .previous>a,.pager .previous>span{float:left}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{color:#777;cursor:not-allowed;background-color:#fff}.label{display:inline;padding:.2em .6em .3em;font-size:75%;font-weight:700;line-height:1;color:#fff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25em}a.label:hover,a.label:focus{color:#fff;text-decoration:none;cursor:pointer}.label:empty{display:none}.btn .label{position:relative;top:-1px}.label-default{background-color:#777}.label-default[href]:hover,.label-default[href]:focus{background-color:#5e5e5e}.label-primary{background-color:#337ab7}.label-primary[href]:hover,.label-primary[href]:focus{background-color:#286090}.label-success{background-color:#5cb85c}.label-success[href]:hover,.label-success[href]:focus{background-color:#449d44}.label-info{background-color:#5bc0de}.label-info[href]:hover,.label-info[href]:focus{background-color:#31b0d5}.label-warning{background-color:#f0ad4e}.label-warning[href]:hover,.label-warning[href]:focus{background-color:#ec971f}.label-danger{background-color:#d9534f}.label-danger[href]:hover,.label-danger[href]:focus{background-color:#c9302c}.badge{display:inline-block;min-width:10px;padding:3px 7px;font-size:12px;font-weight:700;line-height:1;color:#fff;text-align:center;white-space:nowrap;vertical-align:baseline;background-color:#777;border-radius:10px}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.btn-xs .badge{top:0;padding:1px 5px}a.badge:hover,a.badge:focus{color:#fff;text-decoration:none;cursor:pointer}.list-group-item.active>.badge,.nav-pills>.active>a>.badge{color:#337ab7;background-color:#fff}.list-group-item>.badge{float:right}.list-group-item>.badge+.badge{margin-right:5px}.nav-pills>li>a>.badge{margin-left:3px}.jumbotron{padding:30px 15px;margin-bottom:30px;color:inherit;background-color:#eee}.jumbotron h1,.jumbotron .h1{color:inherit}.jumbotron p{margin-bottom:15px;font-size:21px;font-weight:200}.jumbotron>hr{border-top-color:#d5d5d5}.container .jumbotron,.container-fluid .jumbotron{border-radius:6px}.jumbotron .container{max-width:100%}@media screen and (min-width:768px){.jumbotron{padding:48px 0}.container .jumbotron,.container-fluid .jumbotron{padding-right:60px;padding-left:60px}.jumbotron h1,.jumbotron .h1{font-size:63px}}.thumbnail{display:block;padding:4px;margin-bottom:20px;line-height:1.42857143;background-color:#fff;border:1px solid #ddd;border-radius:4px;-webkit-transition:border .2s ease-in-out;-o-transition:border .2s ease-in-out;transition:border .2s ease-in-out}.thumbnail>img,.thumbnail a>img{margin-right:auto;margin-left:auto}a.thumbnail:hover,a.thumbnail:focus,a.thumbnail.active{border-color:#337ab7}.thumbnail .caption{padding:9px;color:#333}.alert{padding:15px;margin-bottom:20px;border:1px solid transparent;border-radius:4px}.alert h4{margin-top:0;color:inherit}.alert .alert-link{font-weight:700}.alert>p,.alert>ul{margin-bottom:0}.alert>p+p{margin-top:5px}.alert-dismissable,.alert-dismissible{padding-right:35px}.alert-dismissable .close,.alert-dismissible .close{position:relative;top:-2px;right:-21px;color:inherit}.alert-success{color:#3c763d;background-color:#dff0d8;border-color:#d6e9c6}.alert-success hr{border-top-color:#c9e2b3}.alert-success .alert-link{color:#2b542c}.alert-info{color:#31708f;background-color:#d9edf7;border-color:#bce8f1}.alert-info hr{border-top-color:#a6e1ec}.alert-info .alert-link{color:#245269}.alert-warning{color:#8a6d3b;background-color:#fcf8e3;border-color:#faebcc}.alert-warning hr{border-top-color:#f7e1b5}.alert-warning .alert-link{color:#66512c}.alert-danger{color:#a94442;background-color:#f2dede;border-color:#ebccd1}.alert-danger hr{border-top-color:#e4b9c0}.alert-danger .alert-link{color:#843534}@-webkit-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@-o-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}.progress{height:20px;margin-bottom:20px;overflow:hidden;background-color:#f5f5f5;border-radius:4px;-webkit-box-shadow:inset 0 1px 2px rgba(0,0,0,.1);box-shadow:inset 0 1px 2px rgba(0,0,0,.1)}.progress-bar{float:left;width:0;height:100%;font-size:12px;line-height:20px;color:#fff;text-align:center;background-color:#337ab7;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,.15);box-shadow:inset 0 -1px 0 rgba(0,0,0,.15);-webkit-transition:width .6s ease;-o-transition:width .6s ease;transition:width .6s ease}.progress-striped .progress-bar,.progress-bar-striped{background-image:-webkit-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:-o-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);-webkit-background-size:40px 40px;background-size:40px 40px}.progress.active .progress-bar,.progress-bar.active{-webkit-animation:progress-bar-stripes 2s linear infinite;-o-animation:progress-bar-stripes 2s linear infinite;animation:progress-bar-stripes 2s linear infinite}.progress-bar-success{background-color:#5cb85c}.progress-striped .progress-bar-success{background-image:-webkit-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:-o-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent)}.progress-bar-info{background-color:#5bc0de}.progress-striped .progress-bar-info{background-image:-webkit-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:-o-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent)}.progress-bar-warning{background-color:#f0ad4e}.progress-striped .progress-bar-warning{background-image:-webkit-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:-o-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent)}.progress-bar-danger{background-color:#d9534f}.progress-striped .progress-bar-danger{background-image:-webkit-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:-o-linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent)}.media{margin-top:15px}.media:first-child{margin-top:0}.media-right,.media>.pull-right{padding-left:10px}.media-left,.media>.pull-left{padding-right:10px}.media-left,.media-right,.media-body{display:table-cell;vertical-align:top}.media-middle{vertical-align:middle}.media-bottom{vertical-align:bottom}.media-heading{margin-top:0;margin-bottom:5px}.media-list{padding-left:0;list-style:none}.list-group{padding-left:0;margin-bottom:20px}.list-group-item{position:relative;display:block;padding:10px 15px;margin-bottom:-1px;background-color:#fff;border:1px solid #ddd}.list-group-item:first-child{border-top-left-radius:4px;border-top-right-radius:4px}.list-group-item:last-child{margin-bottom:0;border-bottom-right-radius:4px;border-bottom-left-radius:4px}a.list-group-item{color:#555}a.list-group-item .list-group-item-heading{color:#333}a.list-group-item:hover,a.list-group-item:focus{color:#555;text-decoration:none;background-color:#f5f5f5}.list-group-item.disabled,.list-group-item.disabled:hover,.list-group-item.disabled:focus{color:#777;cursor:not-allowed;background-color:#eee}.list-group-item.disabled .list-group-item-heading,.list-group-item.disabled:hover .list-group-item-heading,.list-group-item.disabled:focus .list-group-item-heading{color:inherit}.list-group-item.disabled .list-group-item-text,.list-group-item.disabled:hover .list-group-item-text,.list-group-item.disabled:focus .list-group-item-text{color:#777}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{z-index:2;color:#fff;background-color:#337ab7;border-color:#337ab7}.list-group-item.active .list-group-item-heading,.list-group-item.active:hover .list-group-item-heading,.list-group-item.active:focus .list-group-item-heading,.list-group-item.active .list-group-item-heading>small,.list-group-item.active:hover .list-group-item-heading>small,.list-group-item.active:focus .list-group-item-heading>small,.list-group-item.active .list-group-item-heading>.small,.list-group-item.active:hover .list-group-item-heading>.small,.list-group-item.active:focus .list-group-item-heading>.small{color:inherit}.list-group-item.active .list-group-item-text,.list-group-item.active:hover .list-group-item-text,.list-group-item.active:focus .list-group-item-text{color:#c7ddef}.list-group-item-success{color:#3c763d;background-color:#dff0d8}a.list-group-item-success{color:#3c763d}a.list-group-item-success .list-group-item-heading{color:inherit}a.list-group-item-success:hover,a.list-group-item-success:focus{color:#3c763d;background-color:#d0e9c6}a.list-group-item-success.active,a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{color:#fff;background-color:#3c763d;border-color:#3c763d}.list-group-item-info{color:#31708f;background-color:#d9edf7}a.list-group-item-info{color:#31708f}a.list-group-item-info .list-group-item-heading{color:inherit}a.list-group-item-info:hover,a.list-group-item-info:focus{color:#31708f;background-color:#c4e3f3}a.list-group-item-info.active,a.list-group-item-info.active:hover,a.list-group-item-info.active:focus{color:#fff;background-color:#31708f;border-color:#31708f}.list-group-item-warning{color:#8a6d3b;background-color:#fcf8e3}a.list-group-item-warning{color:#8a6d3b}a.list-group-item-warning .list-group-item-heading{color:inherit}a.list-group-item-warning:hover,a.list-group-item-warning:focus{color:#8a6d3b;background-color:#faf2cc}a.list-group-item-warning.active,a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{color:#fff;background-color:#8a6d3b;border-color:#8a6d3b}.list-group-item-danger{color:#a94442;background-color:#f2dede}a.list-group-item-danger{color:#a94442}a.list-group-item-danger .list-group-item-heading{color:inherit}a.list-group-item-danger:hover,a.list-group-item-danger:focus{color:#a94442;background-color:#ebcccc}a.list-group-item-danger.active,a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{color:#fff;background-color:#a94442;border-color:#a94442}.list-group-item-heading{margin-top:0;margin-bottom:5px}.list-group-item-text{margin-bottom:0;line-height:1.3}.panel{margin-bottom:20px;background-color:#fff;border:1px solid transparent;border-radius:4px;-webkit-box-shadow:0 1px 1px rgba(0,0,0,.05);box-shadow:0 1px 1px rgba(0,0,0,.05)}.panel-body{padding:15px}.panel-heading{padding:10px 15px;border-bottom:1px solid transparent;border-top-left-radius:3px;border-top-right-radius:3px}.panel-heading>.dropdown .dropdown-toggle{color:inherit}.panel-title{margin-top:0;margin-bottom:0;font-size:16px;color:inherit}.panel-title>a{color:inherit}.panel-footer{padding:10px 15px;background-color:#f5f5f5;border-top:1px solid #ddd;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.list-group,.panel>.panel-collapse>.list-group{margin-bottom:0}.panel>.list-group .list-group-item,.panel>.panel-collapse>.list-group .list-group-item{border-width:1px 0;border-radius:0}.panel>.list-group:first-child .list-group-item:first-child,.panel>.panel-collapse>.list-group:first-child .list-group-item:first-child{border-top:0;border-top-left-radius:3px;border-top-right-radius:3px}.panel>.list-group:last-child .list-group-item:last-child,.panel>.panel-collapse>.list-group:last-child .list-group-item:last-child{border-bottom:0;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel-heading+.list-group .list-group-item:first-child{border-top-width:0}.list-group+.panel-footer{border-top-width:0}.panel>.table,.panel>.table-responsive>.table,.panel>.panel-collapse>.table{margin-bottom:0}.panel>.table caption,.panel>.table-responsive>.table caption,.panel>.panel-collapse>.table caption{padding-right:15px;padding-left:15px}.panel>.table:first-child,.panel>.table-responsive:first-child>.table:first-child{border-top-left-radius:3px;border-top-right-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child{border-top-left-radius:3px;border-top-right-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:first-child{border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:last-child{border-top-right-radius:3px}.panel>.table:last-child,.panel>.table-responsive:last-child>.table:last-child{border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child{border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:first-child{border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:last-child{border-bottom-right-radius:3px}.panel>.panel-body+.table,.panel>.panel-body+.table-responsive,.panel>.table+.panel-body,.panel>.table-responsive+.panel-body{border-top:1px solid #ddd}.panel>.table>tbody:first-child>tr:first-child th,.panel>.table>tbody:first-child>tr:first-child td{border-top:0}.panel>.table-bordered,.panel>.table-responsive>.table-bordered{border:0}.panel>.table-bordered>thead>tr>th:first-child,.panel>.table-responsive>.table-bordered>thead>tr>th:first-child,.panel>.table-bordered>tbody>tr>th:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:first-child,.panel>.table-bordered>tfoot>tr>th:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:first-child,.panel>.table-bordered>thead>tr>td:first-child,.panel>.table-responsive>.table-bordered>thead>tr>td:first-child,.panel>.table-bordered>tbody>tr>td:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:first-child,.panel>.table-bordered>tfoot>tr>td:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.panel>.table-bordered>thead>tr>th:last-child,.panel>.table-responsive>.table-bordered>thead>tr>th:last-child,.panel>.table-bordered>tbody>tr>th:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:last-child,.panel>.table-bordered>tfoot>tr>th:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:last-child,.panel>.table-bordered>thead>tr>td:last-child,.panel>.table-responsive>.table-bordered>thead>tr>td:last-child,.panel>.table-bordered>tbody>tr>td:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:last-child,.panel>.table-bordered>tfoot>tr>td:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.panel>.table-bordered>thead>tr:first-child>td,.panel>.table-responsive>.table-bordered>thead>tr:first-child>td,.panel>.table-bordered>tbody>tr:first-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>td,.panel>.table-bordered>thead>tr:first-child>th,.panel>.table-responsive>.table-bordered>thead>tr:first-child>th,.panel>.table-bordered>tbody>tr:first-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>th{border-bottom:0}.panel>.table-bordered>tbody>tr:last-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>td,.panel>.table-bordered>tfoot>tr:last-child>td,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>td,.panel>.table-bordered>tbody>tr:last-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>th,.panel>.table-bordered>tfoot>tr:last-child>th,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>th{border-bottom:0}.panel>.table-responsive{margin-bottom:0;border:0}.panel-group{margin-bottom:20px}.panel-group .panel{margin-bottom:0;border-radius:4px}.panel-group .panel+.panel{margin-top:5px}.panel-group .panel-heading{border-bottom:0}.panel-group .panel-heading+.panel-collapse>.panel-body,.panel-group .panel-heading+.panel-collapse>.list-group{border-top:1px solid #ddd}.panel-group .panel-footer{border-top:0}.panel-group .panel-footer+.panel-collapse .panel-body{border-bottom:1px solid #ddd}.panel-default{border-color:#ddd}.panel-default>.panel-heading{color:#333;background-color:#f5f5f5;border-color:#ddd}.panel-default>.panel-heading+.panel-collapse>.panel-body{border-top-color:#ddd}.panel-default>.panel-heading .badge{color:#f5f5f5;background-color:#333}.panel-default>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#ddd}.panel-primary{border-color:#337ab7}.panel-primary>.panel-heading{color:#fff;background-color:#337ab7;border-color:#337ab7}.panel-primary>.panel-heading+.panel-collapse>.panel-body{border-top-color:#337ab7}.panel-primary>.panel-heading .badge{color:#337ab7;background-color:#fff}.panel-primary>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#337ab7}.panel-success{border-color:#d6e9c6}.panel-success>.panel-heading{color:#3c763d;background-color:#dff0d8;border-color:#d6e9c6}.panel-success>.panel-heading+.panel-collapse>.panel-body{border-top-color:#d6e9c6}.panel-success>.panel-heading .badge{color:#dff0d8;background-color:#3c763d}.panel-success>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#d6e9c6}.panel-info{border-color:#bce8f1}.panel-info>.panel-heading{color:#31708f;background-color:#d9edf7;border-color:#bce8f1}.panel-info>.panel-heading+.panel-collapse>.panel-body{border-top-color:#bce8f1}.panel-info>.panel-heading .badge{color:#d9edf7;background-color:#31708f}.panel-info>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#bce8f1}.panel-warning{border-color:#faebcc}.panel-warning>.panel-heading{color:#8a6d3b;background-color:#fcf8e3;border-color:#faebcc}.panel-warning>.panel-heading+.panel-collapse>.panel-body{border-top-color:#faebcc}.panel-warning>.panel-heading .badge{color:#fcf8e3;background-color:#8a6d3b}.panel-warning>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#faebcc}.panel-danger{border-color:#ebccd1}.panel-danger>.panel-heading{color:#a94442;background-color:#f2dede;border-color:#ebccd1}.panel-danger>.panel-heading+.panel-collapse>.panel-body{border-top-color:#ebccd1}.panel-danger>.panel-heading .badge{color:#f2dede;background-color:#a94442}.panel-danger>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#ebccd1}.embed-responsive{position:relative;display:block;height:0;padding:0;overflow:hidden}.embed-responsive .embed-responsive-item,.embed-responsive iframe,.embed-responsive embed,.embed-responsive object,.embed-responsive video{position:absolute;top:0;bottom:0;left:0;width:100%;height:100%;border:0}.embed-responsive.embed-responsive-16by9{padding-bottom:56.25%}.embed-responsive.embed-responsive-4by3{padding-bottom:75%}.well{min-height:20px;padding:19px;margin-bottom:20px;background-color:#f5f5f5;border:1px solid #e3e3e3;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,.05);box-shadow:inset 0 1px 1px rgba(0,0,0,.05)}.well blockquote{border-color:#ddd;border-color:rgba(0,0,0,.15)}.well-lg{padding:24px;border-radius:6px}.well-sm{padding:9px;border-radius:3px}.close{float:right;font-size:21px;font-weight:700;line-height:1;color:#000;text-shadow:0 1px 0 #fff;filter:alpha(opacity=20);opacity:.2}.close:hover,.close:focus{color:#000;text-decoration:none;cursor:pointer;filter:alpha(opacity=50);opacity:.5}button.close{-webkit-appearance:none;padding:0;cursor:pointer;background:0 0;border:0}.modal-open{overflow:hidden}.modal{position:fixed;top:0;right:0;bottom:0;left:0;z-index:1040;display:none;overflow:hidden;-webkit-overflow-scrolling:touch;outline:0}.modal.fade .modal-dialog{-webkit-transition:-webkit-transform .3s ease-out;-o-transition:-o-transform .3s ease-out;transition:transform .3s ease-out;-webkit-transform:translate(0,-25%);-ms-transform:translate(0,-25%);-o-transform:translate(0,-25%);transform:translate(0,-25%)}.modal.in .modal-dialog{-webkit-transform:translate(0,0);-ms-transform:translate(0,0);-o-transform:translate(0,0);transform:translate(0,0)}.modal-open .modal{overflow-x:hidden;overflow-y:auto}.modal-dialog{position:relative;width:auto;margin:10px}.modal-content{position:relative;background-color:#fff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #999;border:1px solid rgba(0,0,0,.2);border-radius:6px;outline:0;-webkit-box-shadow:0 3px 9px rgba(0,0,0,.5);box-shadow:0 3px 9px rgba(0,0,0,.5)}.modal-backdrop{position:absolute;top:0;right:0;left:0;background-color:#000}.modal-backdrop.fade{filter:alpha(opacity=0);opacity:0}.modal-backdrop.in{filter:alpha(opacity=50);opacity:.5}.modal-header{min-height:16.43px;padding:15px;border-bottom:1px solid #e5e5e5}.modal-header .close{margin-top:-2px}.modal-title{margin:0;line-height:1.42857143}.modal-body{position:relative;padding:15px}.modal-footer{padding:15px;text-align:right;border-top:1px solid #e5e5e5}.modal-footer .btn+.btn{margin-bottom:0;margin-left:5px}.modal-footer .btn-group .btn+.btn{margin-left:-1px}.modal-footer .btn-block+.btn-block{margin-left:0}.modal-scrollbar-measure{position:absolute;top:-9999px;width:50px;height:50px;overflow:scroll}@media (min-width:768px){.modal-dialog{width:600px;margin:30px auto}.modal-content{-webkit-box-shadow:0 5px 15px rgba(0,0,0,.5);box-shadow:0 5px 15px rgba(0,0,0,.5)}.modal-sm{width:300px}}@media (min-width:992px){.modal-lg{width:900px}}.tooltip{position:absolute;z-index:1070;display:block;font-family:"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:12px;font-weight:400;line-height:1.4;visibility:visible;filter:alpha(opacity=0);opacity:0}.tooltip.in{filter:alpha(opacity=90);opacity:.9}.tooltip.top{padding:5px 0;margin-top:-3px}.tooltip.right{padding:0 5px;margin-left:3px}.tooltip.bottom{padding:5px 0;margin-top:3px}.tooltip.left{padding:0 5px;margin-left:-3px}.tooltip-inner{max-width:200px;padding:3px 8px;color:#fff;text-align:center;text-decoration:none;background-color:#000;border-radius:4px}.tooltip-arrow{position:absolute;width:0;height:0;border-color:transparent;border-style:solid}.tooltip.top .tooltip-arrow{bottom:0;left:50%;margin-left:-5px;border-width:5px 5px 0;border-top-color:#000}.tooltip.top-left .tooltip-arrow{right:5px;bottom:0;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:#000}.tooltip.top-right .tooltip-arrow{bottom:0;left:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:#000}.tooltip.right .tooltip-arrow{top:50%;left:0;margin-top:-5px;border-width:5px 5px 5px 0;border-right-color:#000}.tooltip.left .tooltip-arrow{top:50%;right:0;margin-top:-5px;border-width:5px 0 5px 5px;border-left-color:#000}.tooltip.bottom .tooltip-arrow{top:0;left:50%;margin-left:-5px;border-width:0 5px 5px;border-bottom-color:#000}.tooltip.bottom-left .tooltip-arrow{top:0;right:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:#000}.tooltip.bottom-right .tooltip-arrow{top:0;left:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:#000}.popover{position:absolute;top:0;left:0;z-index:1060;display:none;max-width:276px;padding:1px;font-family:"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:14px;font-weight:400;line-height:1.42857143;text-align:left;white-space:normal;background-color:#fff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #ccc;border:1px solid rgba(0,0,0,.2);border-radius:6px;-webkit-box-shadow:0 5px 10px rgba(0,0,0,.2);box-shadow:0 5px 10px rgba(0,0,0,.2)}.popover.top{margin-top:-10px}.popover.right{margin-left:10px}.popover.bottom{margin-top:10px}.popover.left{margin-left:-10px}.popover-title{padding:8px 14px;margin:0;font-size:14px;background-color:#f7f7f7;border-bottom:1px solid #ebebeb;border-radius:5px 5px 0 0}.popover-content{padding:9px 14px}.popover>.arrow,.popover>.arrow:after{position:absolute;display:block;width:0;height:0;border-color:transparent;border-style:solid}.popover>.arrow{border-width:11px}.popover>.arrow:after{content:"";border-width:10px}.popover.top>.arrow{bottom:-11px;left:50%;margin-left:-11px;border-top-color:#999;border-top-color:rgba(0,0,0,.25);border-bottom-width:0}.popover.top>.arrow:after{bottom:1px;margin-left:-10px;content:" ";border-top-color:#fff;border-bottom-width:0}.popover.right>.arrow{top:50%;left:-11px;margin-top:-11px;border-right-color:#999;border-right-color:rgba(0,0,0,.25);border-left-width:0}.popover.right>.arrow:after{bottom:-10px;left:1px;content:" ";border-right-color:#fff;border-left-width:0}.popover.bottom>.arrow{top:-11px;left:50%;margin-left:-11px;border-top-width:0;border-bottom-color:#999;border-bottom-color:rgba(0,0,0,.25)}.popover.bottom>.arrow:after{top:1px;margin-left:-10px;content:" ";border-top-width:0;border-bottom-color:#fff}.popover.left>.arrow{top:50%;right:-11px;margin-top:-11px;border-right-width:0;border-left-color:#999;border-left-color:rgba(0,0,0,.25)}.popover.left>.arrow:after{right:1px;bottom:-10px;content:" ";border-right-width:0;border-left-color:#fff}.carousel{position:relative}.carousel-inner{position:relative;width:100%;overflow:hidden}.carousel-inner>.item{position:relative;display:none;-webkit-transition:.6s ease-in-out left;-o-transition:.6s ease-in-out left;transition:.6s ease-in-out left}.carousel-inner>.item>img,.carousel-inner>.item>a>img{line-height:1}@media all and (transform-3d),(-webkit-transform-3d){.carousel-inner>.item{-webkit-transition:-webkit-transform .6s ease-in-out;-o-transition:-o-transform .6s ease-in-out;transition:transform .6s ease-in-out;-webkit-backface-visibility:hidden;backface-visibility:hidden;-webkit-perspective:1000;perspective:1000}.carousel-inner>.item.next,.carousel-inner>.item.active.right{left:0;-webkit-transform:translate3d(100%,0,0);transform:translate3d(100%,0,0)}.carousel-inner>.item.prev,.carousel-inner>.item.active.left{left:0;-webkit-transform:translate3d(-100%,0,0);transform:translate3d(-100%,0,0)}.carousel-inner>.item.next.left,.carousel-inner>.item.prev.right,.carousel-inner>.item.active{left:0;-webkit-transform:translate3d(0,0,0);transform:translate3d(0,0,0)}}.carousel-inner>.active,.carousel-inner>.next,.carousel-inner>.prev{display:block}.carousel-inner>.active{left:0}.carousel-inner>.next,.carousel-inner>.prev{position:absolute;top:0;width:100%}.carousel-inner>.next{left:100%}.carousel-inner>.prev{left:-100%}.carousel-inner>.next.left,.carousel-inner>.prev.right{left:0}.carousel-inner>.active.left{left:-100%}.carousel-inner>.active.right{left:100%}.carousel-control{position:absolute;top:0;bottom:0;left:0;width:15%;font-size:20px;color:#fff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,.6);filter:alpha(opacity=50);opacity:.5}.carousel-control.left{background-image:-webkit-linear-gradient(left,rgba(0,0,0,.5) 0,rgba(0,0,0,.0001) 100%);background-image:-o-linear-gradient(left,rgba(0,0,0,.5) 0,rgba(0,0,0,.0001) 100%);background-image:-webkit-gradient(linear,left top,right top,from(rgba(0,0,0,.5)),to(rgba(0,0,0,.0001)));background-image:linear-gradient(to right,rgba(0,0,0,.5) 0,rgba(0,0,0,.0001) 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1);background-repeat:repeat-x}.carousel-control.right{right:0;left:auto;background-image:-webkit-linear-gradient(left,rgba(0,0,0,.0001) 0,rgba(0,0,0,.5) 100%);background-image:-o-linear-gradient(left,rgba(0,0,0,.0001) 0,rgba(0,0,0,.5) 100%);background-image:-webkit-gradient(linear,left top,right top,from(rgba(0,0,0,.0001)),to(rgba(0,0,0,.5)));background-image:linear-gradient(to right,rgba(0,0,0,.0001) 0,rgba(0,0,0,.5) 100%);filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1);background-repeat:repeat-x}.carousel-control:hover,.carousel-control:focus{color:#fff;text-decoration:none;filter:alpha(opacity=90);outline:0;opacity:.9}.carousel-control .icon-prev,.carousel-control .icon-next,.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right{position:absolute;top:50%;z-index:5;display:inline-block}.carousel-control .icon-prev,.carousel-control .glyphicon-chevron-left{left:50%;margin-left:-10px}.carousel-control .icon-next,.carousel-control .glyphicon-chevron-right{right:50%;margin-right:-10px}.carousel-control .icon-prev,.carousel-control .icon-next{width:20px;height:20px;margin-top:-10px;font-family:serif}.carousel-control .icon-prev:before{content:'\2039'}.carousel-control .icon-next:before{content:'\203a'}.carousel-indicators{position:absolute;bottom:10px;left:50%;z-index:15;width:60%;padding-left:0;margin-left:-30%;text-align:center;list-style:none}.carousel-indicators li{display:inline-block;width:10px;height:10px;margin:1px;text-indent:-999px;cursor:pointer;background-color:#000 \9;background-color:rgba(0,0,0,0);border:1px solid #fff;border-radius:10px}.carousel-indicators .active{width:12px;height:12px;margin:0;background-color:#fff}.carousel-caption{position:absolute;right:15%;bottom:20px;left:15%;z-index:10;padding-top:20px;padding-bottom:20px;color:#fff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,.6)}.carousel-caption .btn{text-shadow:none}@media screen and (min-width:768px){.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right,.carousel-control .icon-prev,.carousel-control .icon-next{width:30px;height:30px;margin-top:-15px;font-size:30px}.carousel-control .glyphicon-chevron-left,.carousel-control .icon-prev{margin-left:-15px}.carousel-control .glyphicon-chevron-right,.carousel-control .icon-next{margin-right:-15px}.carousel-caption{right:20%;left:20%;padding-bottom:30px}.carousel-indicators{bottom:20px}}.clearfix:before,.clearfix:after,.dl-horizontal dd:before,.dl-horizontal dd:after,.container:before,.container:after,.container-fluid:before,.container-fluid:after,.row:before,.row:after,.form-horizontal .form-group:before,.form-horizontal .form-group:after,.btn-toolbar:before,.btn-toolbar:after,.btn-group-vertical>.btn-group:before,.btn-group-vertical>.btn-group:after,.nav:before,.nav:after,.navbar:before,.navbar:after,.navbar-header:before,.navbar-header:after,.navbar-collapse:before,.navbar-collapse:after,.pager:before,.pager:after,.panel-body:before,.panel-body:after,.modal-footer:before,.modal-footer:after{display:table;content:" "}.clearfix:after,.dl-horizontal dd:after,.container:after,.container-fluid:after,.row:after,.form-horizontal .form-group:after,.btn-toolbar:after,.btn-group-vertical>.btn-group:after,.nav:after,.navbar:after,.navbar-header:after,.navbar-collapse:after,.pager:after,.panel-body:after,.modal-footer:after{clear:both}.center-block{display:block;margin-right:auto;margin-left:auto}.pull-right{float:right!important}.pull-left{float:left!important}.hide{display:none!important}.show{display:block!important}.invisible{visibility:hidden}.text-hide{font:0/0 a;color:transparent;text-shadow:none;background-color:transparent;border:0}.hidden{display:none!important;visibility:hidden!important}.affix{position:fixed}@-ms-viewport{width:device-width}.visible-xs,.visible-sm,.visible-md,.visible-lg{display:none!important}.visible-xs-block,.visible-xs-inline,.visible-xs-inline-block,.visible-sm-block,.visible-sm-inline,.visible-sm-inline-block,.visible-md-block,.visible-md-inline,.visible-md-inline-block,.visible-lg-block,.visible-lg-inline,.visible-lg-inline-block{display:none!important}@media (max-width:767px){.visible-xs{display:block!important}table.visible-xs{display:table}tr.visible-xs{display:table-row!important}th.visible-xs,td.visible-xs{display:table-cell!important}}@media (max-width:767px){.visible-xs-block{display:block!important}}@media (max-width:767px){.visible-xs-inline{display:inline!important}}@media (max-width:767px){.visible-xs-inline-block{display:inline-block!important}}@media (min-width:768px) and (max-width:991px){.visible-sm{display:block!important}table.visible-sm{display:table}tr.visible-sm{display:table-row!important}th.visible-sm,td.visible-sm{display:table-cell!important}}@media (min-width:768px) and (max-width:991px){.visible-sm-block{display:block!important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline{display:inline!important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline-block{display:inline-block!important}}@media (min-width:992px) and (max-width:1199px){.visible-md{display:block!important}table.visible-md{display:table}tr.visible-md{display:table-row!important}th.visible-md,td.visible-md{display:table-cell!important}}@media (min-width:992px) and (max-width:1199px){.visible-md-block{display:block!important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline{display:inline!important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline-block{display:inline-block!important}}@media (min-width:1200px){.visible-lg{display:block!important}table.visible-lg{display:table}tr.visible-lg{display:table-row!important}th.visible-lg,td.visible-lg{display:table-cell!important}}@media (min-width:1200px){.visible-lg-block{display:block!important}}@media (min-width:1200px){.visible-lg-inline{display:inline!important}}@media (min-width:1200px){.visible-lg-inline-block{display:inline-block!important}}@media (max-width:767px){.hidden-xs{display:none!important}}@media (min-width:768px) and (max-width:991px){.hidden-sm{display:none!important}}@media (min-width:992px) and (max-width:1199px){.hidden-md{display:none!important}}@media (min-width:1200px){.hidden-lg{display:none!important}}.visible-print{display:none!important}@media print{.visible-print{display:block!important}table.visible-print{display:table}tr.visible-print{display:table-row!important}th.visible-print,td.visible-print{display:table-cell!important}}.visible-print-block{display:none!important}@media print{.visible-print-block{display:block!important}}.visible-print-inline{display:none!important}@media print{.visible-print-inline{display:inline!important}}.visible-print-inline-block{display:none!important}@media print{.visible-print-inline-block{display:inline-block!important}}@media print{.hidden-print{display:none!important}} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/css/cerulean.min.css b/www/bootstrap-3.3.1/css/cerulean.min.css deleted file mode 100644 index 0052d82..0000000 --- a/www/bootstrap-3.3.1/css/cerulean.min.css +++ /dev/null @@ -1,7 +0,0 @@ -/*! - * bootswatch v3.3.1+1 - * Homepage: http://bootswatch.com - * Copyright 2012-2014 Thomas Park - * Licensed under MIT - * Based on Bootstrap -*//*! normalize.css v3.0.2 | MIT License | git.io/normalize */html{font-family:sans-serif;-ms-text-size-adjust:100%;-webkit-text-size-adjust:100%}body{margin:0}article,aside,details,figcaption,figure,footer,header,hgroup,main,menu,nav,section,summary{display:block}audio,canvas,progress,video{display:inline-block;vertical-align:baseline}audio:not([controls]){display:none;height:0}[hidden],template{display:none}a{background-color:transparent}a:active,a:hover{outline:0}abbr[title]{border-bottom:1px dotted}b,strong{font-weight:bold}dfn{font-style:italic}h1{font-size:2em;margin:0.67em 0}mark{background:#ff0;color:#000}small{font-size:80%}sub,sup{font-size:75%;line-height:0;position:relative;vertical-align:baseline}sup{top:-0.5em}sub{bottom:-0.25em}img{border:0}svg:not(:root){overflow:hidden}figure{margin:1em 40px}hr{-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box;height:0}pre{overflow:auto}code,kbd,pre,samp{font-family:monospace, monospace;font-size:1em}button,input,optgroup,select,textarea{color:inherit;font:inherit;margin:0}button{overflow:visible}button,select{text-transform:none}button,html input[type="button"],input[type="reset"],input[type="submit"]{-webkit-appearance:button;cursor:pointer}button[disabled],html input[disabled]{cursor:default}button::-moz-focus-inner,input::-moz-focus-inner{border:0;padding:0}input{line-height:normal}input[type="checkbox"],input[type="radio"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box;padding:0}input[type="number"]::-webkit-inner-spin-button,input[type="number"]::-webkit-outer-spin-button{height:auto}input[type="search"]{-webkit-appearance:textfield;-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box}input[type="search"]::-webkit-search-cancel-button,input[type="search"]::-webkit-search-decoration{-webkit-appearance:none}fieldset{border:1px solid #c0c0c0;margin:0 2px;padding:0.35em 0.625em 0.75em}legend{border:0;padding:0}textarea{overflow:auto}optgroup{font-weight:bold}table{border-collapse:collapse;border-spacing:0}td,th{padding:0}/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */@media print{*,*:before,*:after{background:transparent !important;color:#000 !important;-webkit-box-shadow:none !important;box-shadow:none !important;text-shadow:none !important}a,a:visited{text-decoration:underline}a[href]:after{content:" (" attr(href) ")"}abbr[title]:after{content:" (" attr(title) ")"}a[href^="#"]:after,a[href^="javascript:"]:after{content:""}pre,blockquote{border:1px solid #999;page-break-inside:avoid}thead{display:table-header-group}tr,img{page-break-inside:avoid}img{max-width:100% !important}p,h2,h3{orphans:3;widows:3}h2,h3{page-break-after:avoid}select{background:#fff !important}.navbar{display:none}.btn>.caret,.dropup>.btn>.caret{border-top-color:#000 !important}.label{border:1px solid #000}.table{border-collapse:collapse !important}.table td,.table th{background-color:#fff !important}.table-bordered th,.table-bordered td{border:1px solid #ddd !important}}@font-face{font-family:'Glyphicons Halflings';src:url('../fonts/glyphicons-halflings-regular.eot');src:url('../fonts/glyphicons-halflings-regular.eot?#iefix') format('embedded-opentype'),url('../fonts/glyphicons-halflings-regular.woff') format('woff'),url('../fonts/glyphicons-halflings-regular.ttf') format('truetype'),url('../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular') format('svg')}.glyphicon{position:relative;top:1px;display:inline-block;font-family:'Glyphicons Halflings';font-style:normal;font-weight:normal;line-height:1;-webkit-font-smoothing:antialiased;-moz-osx-font-smoothing:grayscale}.glyphicon-asterisk:before{content:"\2a"}.glyphicon-plus:before{content:"\2b"}.glyphicon-euro:before,.glyphicon-eur:before{content:"\20ac"}.glyphicon-minus:before{content:"\2212"}.glyphicon-cloud:before{content:"\2601"}.glyphicon-envelope:before{content:"\2709"}.glyphicon-pencil:before{content:"\270f"}.glyphicon-glass:before{content:"\e001"}.glyphicon-music:before{content:"\e002"}.glyphicon-search:before{content:"\e003"}.glyphicon-heart:before{content:"\e005"}.glyphicon-star:before{content:"\e006"}.glyphicon-star-empty:before{content:"\e007"}.glyphicon-user:before{content:"\e008"}.glyphicon-film:before{content:"\e009"}.glyphicon-th-large:before{content:"\e010"}.glyphicon-th:before{content:"\e011"}.glyphicon-th-list:before{content:"\e012"}.glyphicon-ok:before{content:"\e013"}.glyphicon-remove:before{content:"\e014"}.glyphicon-zoom-in:before{content:"\e015"}.glyphicon-zoom-out:before{content:"\e016"}.glyphicon-off:before{content:"\e017"}.glyphicon-signal:before{content:"\e018"}.glyphicon-cog:before{content:"\e019"}.glyphicon-trash:before{content:"\e020"}.glyphicon-home:before{content:"\e021"}.glyphicon-file:before{content:"\e022"}.glyphicon-time:before{content:"\e023"}.glyphicon-road:before{content:"\e024"}.glyphicon-download-alt:before{content:"\e025"}.glyphicon-download:before{content:"\e026"}.glyphicon-upload:before{content:"\e027"}.glyphicon-inbox:before{content:"\e028"}.glyphicon-play-circle:before{content:"\e029"}.glyphicon-repeat:before{content:"\e030"}.glyphicon-refresh:before{content:"\e031"}.glyphicon-list-alt:before{content:"\e032"}.glyphicon-lock:before{content:"\e033"}.glyphicon-flag:before{content:"\e034"}.glyphicon-headphones:before{content:"\e035"}.glyphicon-volume-off:before{content:"\e036"}.glyphicon-volume-down:before{content:"\e037"}.glyphicon-volume-up:before{content:"\e038"}.glyphicon-qrcode:before{content:"\e039"}.glyphicon-barcode:before{content:"\e040"}.glyphicon-tag:before{content:"\e041"}.glyphicon-tags:before{content:"\e042"}.glyphicon-book:before{content:"\e043"}.glyphicon-bookmark:before{content:"\e044"}.glyphicon-print:before{content:"\e045"}.glyphicon-camera:before{content:"\e046"}.glyphicon-font:before{content:"\e047"}.glyphicon-bold:before{content:"\e048"}.glyphicon-italic:before{content:"\e049"}.glyphicon-text-height:before{content:"\e050"}.glyphicon-text-width:before{content:"\e051"}.glyphicon-align-left:before{content:"\e052"}.glyphicon-align-center:before{content:"\e053"}.glyphicon-align-right:before{content:"\e054"}.glyphicon-align-justify:before{content:"\e055"}.glyphicon-list:before{content:"\e056"}.glyphicon-indent-left:before{content:"\e057"}.glyphicon-indent-right:before{content:"\e058"}.glyphicon-facetime-video:before{content:"\e059"}.glyphicon-picture:before{content:"\e060"}.glyphicon-map-marker:before{content:"\e062"}.glyphicon-adjust:before{content:"\e063"}.glyphicon-tint:before{content:"\e064"}.glyphicon-edit:before{content:"\e065"}.glyphicon-share:before{content:"\e066"}.glyphicon-check:before{content:"\e067"}.glyphicon-move:before{content:"\e068"}.glyphicon-step-backward:before{content:"\e069"}.glyphicon-fast-backward:before{content:"\e070"}.glyphicon-backward:before{content:"\e071"}.glyphicon-play:before{content:"\e072"}.glyphicon-pause:before{content:"\e073"}.glyphicon-stop:before{content:"\e074"}.glyphicon-forward:before{content:"\e075"}.glyphicon-fast-forward:before{content:"\e076"}.glyphicon-step-forward:before{content:"\e077"}.glyphicon-eject:before{content:"\e078"}.glyphicon-chevron-left:before{content:"\e079"}.glyphicon-chevron-right:before{content:"\e080"}.glyphicon-plus-sign:before{content:"\e081"}.glyphicon-minus-sign:before{content:"\e082"}.glyphicon-remove-sign:before{content:"\e083"}.glyphicon-ok-sign:before{content:"\e084"}.glyphicon-question-sign:before{content:"\e085"}.glyphicon-info-sign:before{content:"\e086"}.glyphicon-screenshot:before{content:"\e087"}.glyphicon-remove-circle:before{content:"\e088"}.glyphicon-ok-circle:before{content:"\e089"}.glyphicon-ban-circle:before{content:"\e090"}.glyphicon-arrow-left:before{content:"\e091"}.glyphicon-arrow-right:before{content:"\e092"}.glyphicon-arrow-up:before{content:"\e093"}.glyphicon-arrow-down:before{content:"\e094"}.glyphicon-share-alt:before{content:"\e095"}.glyphicon-resize-full:before{content:"\e096"}.glyphicon-resize-small:before{content:"\e097"}.glyphicon-exclamation-sign:before{content:"\e101"}.glyphicon-gift:before{content:"\e102"}.glyphicon-leaf:before{content:"\e103"}.glyphicon-fire:before{content:"\e104"}.glyphicon-eye-open:before{content:"\e105"}.glyphicon-eye-close:before{content:"\e106"}.glyphicon-warning-sign:before{content:"\e107"}.glyphicon-plane:before{content:"\e108"}.glyphicon-calendar:before{content:"\e109"}.glyphicon-random:before{content:"\e110"}.glyphicon-comment:before{content:"\e111"}.glyphicon-magnet:before{content:"\e112"}.glyphicon-chevron-up:before{content:"\e113"}.glyphicon-chevron-down:before{content:"\e114"}.glyphicon-retweet:before{content:"\e115"}.glyphicon-shopping-cart:before{content:"\e116"}.glyphicon-folder-close:before{content:"\e117"}.glyphicon-folder-open:before{content:"\e118"}.glyphicon-resize-vertical:before{content:"\e119"}.glyphicon-resize-horizontal:before{content:"\e120"}.glyphicon-hdd:before{content:"\e121"}.glyphicon-bullhorn:before{content:"\e122"}.glyphicon-bell:before{content:"\e123"}.glyphicon-certificate:before{content:"\e124"}.glyphicon-thumbs-up:before{content:"\e125"}.glyphicon-thumbs-down:before{content:"\e126"}.glyphicon-hand-right:before{content:"\e127"}.glyphicon-hand-left:before{content:"\e128"}.glyphicon-hand-up:before{content:"\e129"}.glyphicon-hand-down:before{content:"\e130"}.glyphicon-circle-arrow-right:before{content:"\e131"}.glyphicon-circle-arrow-left:before{content:"\e132"}.glyphicon-circle-arrow-up:before{content:"\e133"}.glyphicon-circle-arrow-down:before{content:"\e134"}.glyphicon-globe:before{content:"\e135"}.glyphicon-wrench:before{content:"\e136"}.glyphicon-tasks:before{content:"\e137"}.glyphicon-filter:before{content:"\e138"}.glyphicon-briefcase:before{content:"\e139"}.glyphicon-fullscreen:before{content:"\e140"}.glyphicon-dashboard:before{content:"\e141"}.glyphicon-paperclip:before{content:"\e142"}.glyphicon-heart-empty:before{content:"\e143"}.glyphicon-link:before{content:"\e144"}.glyphicon-phone:before{content:"\e145"}.glyphicon-pushpin:before{content:"\e146"}.glyphicon-usd:before{content:"\e148"}.glyphicon-gbp:before{content:"\e149"}.glyphicon-sort:before{content:"\e150"}.glyphicon-sort-by-alphabet:before{content:"\e151"}.glyphicon-sort-by-alphabet-alt:before{content:"\e152"}.glyphicon-sort-by-order:before{content:"\e153"}.glyphicon-sort-by-order-alt:before{content:"\e154"}.glyphicon-sort-by-attributes:before{content:"\e155"}.glyphicon-sort-by-attributes-alt:before{content:"\e156"}.glyphicon-unchecked:before{content:"\e157"}.glyphicon-expand:before{content:"\e158"}.glyphicon-collapse-down:before{content:"\e159"}.glyphicon-collapse-up:before{content:"\e160"}.glyphicon-log-in:before{content:"\e161"}.glyphicon-flash:before{content:"\e162"}.glyphicon-log-out:before{content:"\e163"}.glyphicon-new-window:before{content:"\e164"}.glyphicon-record:before{content:"\e165"}.glyphicon-save:before{content:"\e166"}.glyphicon-open:before{content:"\e167"}.glyphicon-saved:before{content:"\e168"}.glyphicon-import:before{content:"\e169"}.glyphicon-export:before{content:"\e170"}.glyphicon-send:before{content:"\e171"}.glyphicon-floppy-disk:before{content:"\e172"}.glyphicon-floppy-saved:before{content:"\e173"}.glyphicon-floppy-remove:before{content:"\e174"}.glyphicon-floppy-save:before{content:"\e175"}.glyphicon-floppy-open:before{content:"\e176"}.glyphicon-credit-card:before{content:"\e177"}.glyphicon-transfer:before{content:"\e178"}.glyphicon-cutlery:before{content:"\e179"}.glyphicon-header:before{content:"\e180"}.glyphicon-compressed:before{content:"\e181"}.glyphicon-earphone:before{content:"\e182"}.glyphicon-phone-alt:before{content:"\e183"}.glyphicon-tower:before{content:"\e184"}.glyphicon-stats:before{content:"\e185"}.glyphicon-sd-video:before{content:"\e186"}.glyphicon-hd-video:before{content:"\e187"}.glyphicon-subtitles:before{content:"\e188"}.glyphicon-sound-stereo:before{content:"\e189"}.glyphicon-sound-dolby:before{content:"\e190"}.glyphicon-sound-5-1:before{content:"\e191"}.glyphicon-sound-6-1:before{content:"\e192"}.glyphicon-sound-7-1:before{content:"\e193"}.glyphicon-copyright-mark:before{content:"\e194"}.glyphicon-registration-mark:before{content:"\e195"}.glyphicon-cloud-download:before{content:"\e197"}.glyphicon-cloud-upload:before{content:"\e198"}.glyphicon-tree-conifer:before{content:"\e199"}.glyphicon-tree-deciduous:before{content:"\e200"}*{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}*:before,*:after{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}html{font-size:10px;-webkit-tap-highlight-color:rgba(0,0,0,0)}body{font-family:"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:14px;line-height:1.42857143;color:#555555;background-color:#ffffff}input,button,select,textarea{font-family:inherit;font-size:inherit;line-height:inherit}a{color:#2fa4e7;text-decoration:none}a:hover,a:focus{color:#157ab5;text-decoration:underline}a:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}figure{margin:0}img{vertical-align:middle}.img-responsive,.thumbnail>img,.thumbnail a>img,.carousel-inner>.item>img,.carousel-inner>.item>a>img{display:block;max-width:100%;height:auto}.img-rounded{border-radius:6px}.img-thumbnail{padding:4px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:all .2s ease-in-out;-o-transition:all .2s ease-in-out;transition:all .2s ease-in-out;display:inline-block;max-width:100%;height:auto}.img-circle{border-radius:50%}hr{margin-top:20px;margin-bottom:20px;border:0;border-top:1px solid #eeeeee}.sr-only{position:absolute;width:1px;height:1px;margin:-1px;padding:0;overflow:hidden;clip:rect(0, 0, 0, 0);border:0}.sr-only-focusable:active,.sr-only-focusable:focus{position:static;width:auto;height:auto;margin:0;overflow:visible;clip:auto}h1,h2,h3,h4,h5,h6,.h1,.h2,.h3,.h4,.h5,.h6{font-family:"Helvetica Neue",Helvetica,Arial,sans-serif;font-weight:500;line-height:1.1;color:#317eac}h1 small,h2 small,h3 small,h4 small,h5 small,h6 small,.h1 small,.h2 small,.h3 small,.h4 small,.h5 small,.h6 small,h1 .small,h2 .small,h3 .small,h4 .small,h5 .small,h6 .small,.h1 .small,.h2 .small,.h3 .small,.h4 .small,.h5 .small,.h6 .small{font-weight:normal;line-height:1;color:#999999}h1,.h1,h2,.h2,h3,.h3{margin-top:20px;margin-bottom:10px}h1 small,.h1 small,h2 small,.h2 small,h3 small,.h3 small,h1 .small,.h1 .small,h2 .small,.h2 .small,h3 .small,.h3 .small{font-size:65%}h4,.h4,h5,.h5,h6,.h6{margin-top:10px;margin-bottom:10px}h4 small,.h4 small,h5 small,.h5 small,h6 small,.h6 small,h4 .small,.h4 .small,h5 .small,.h5 .small,h6 .small,.h6 .small{font-size:75%}h1,.h1{font-size:36px}h2,.h2{font-size:30px}h3,.h3{font-size:24px}h4,.h4{font-size:18px}h5,.h5{font-size:14px}h6,.h6{font-size:12px}p{margin:0 0 10px}.lead{margin-bottom:20px;font-size:16px;font-weight:300;line-height:1.4}@media (min-width:768px){.lead{font-size:21px}}small,.small{font-size:85%}mark,.mark{background-color:#fcf8e3;padding:.2em}.text-left{text-align:left}.text-right{text-align:right}.text-center{text-align:center}.text-justify{text-align:justify}.text-nowrap{white-space:nowrap}.text-lowercase{text-transform:lowercase}.text-uppercase{text-transform:uppercase}.text-capitalize{text-transform:capitalize}.text-muted{color:#999999}.text-primary{color:#2fa4e7}a.text-primary:hover{color:#178acc}.text-success{color:#468847}a.text-success:hover{color:#356635}.text-info{color:#3a87ad}a.text-info:hover{color:#2d6987}.text-warning{color:#c09853}a.text-warning:hover{color:#a47e3c}.text-danger{color:#b94a48}a.text-danger:hover{color:#953b39}.bg-primary{color:#fff;background-color:#2fa4e7}a.bg-primary:hover{background-color:#178acc}.bg-success{background-color:#dff0d8}a.bg-success:hover{background-color:#c1e2b3}.bg-info{background-color:#d9edf7}a.bg-info:hover{background-color:#afd9ee}.bg-warning{background-color:#fcf8e3}a.bg-warning:hover{background-color:#f7ecb5}.bg-danger{background-color:#f2dede}a.bg-danger:hover{background-color:#e4b9b9}.page-header{padding-bottom:9px;margin:40px 0 20px;border-bottom:1px solid #eeeeee}ul,ol{margin-top:0;margin-bottom:10px}ul ul,ol ul,ul ol,ol ol{margin-bottom:0}.list-unstyled{padding-left:0;list-style:none}.list-inline{padding-left:0;list-style:none;margin-left:-5px}.list-inline>li{display:inline-block;padding-left:5px;padding-right:5px}dl{margin-top:0;margin-bottom:20px}dt,dd{line-height:1.42857143}dt{font-weight:bold}dd{margin-left:0}@media (min-width:768px){.dl-horizontal dt{float:left;width:160px;clear:left;text-align:right;overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.dl-horizontal dd{margin-left:180px}}abbr[title],abbr[data-original-title]{cursor:help;border-bottom:1px dotted #999999}.initialism{font-size:90%;text-transform:uppercase}blockquote{padding:10px 20px;margin:0 0 20px;font-size:17.5px;border-left:5px solid #eeeeee}blockquote p:last-child,blockquote ul:last-child,blockquote ol:last-child{margin-bottom:0}blockquote footer,blockquote small,blockquote .small{display:block;font-size:80%;line-height:1.42857143;color:#999999}blockquote footer:before,blockquote small:before,blockquote .small:before{content:'\2014 \00A0'}.blockquote-reverse,blockquote.pull-right{padding-right:15px;padding-left:0;border-right:5px solid #eeeeee;border-left:0;text-align:right}.blockquote-reverse footer:before,blockquote.pull-right footer:before,.blockquote-reverse small:before,blockquote.pull-right small:before,.blockquote-reverse .small:before,blockquote.pull-right .small:before{content:''}.blockquote-reverse footer:after,blockquote.pull-right footer:after,.blockquote-reverse small:after,blockquote.pull-right small:after,.blockquote-reverse .small:after,blockquote.pull-right .small:after{content:'\00A0 \2014'}address{margin-bottom:20px;font-style:normal;line-height:1.42857143}code,kbd,pre,samp{font-family:monospace}code{padding:2px 4px;font-size:90%;color:#c7254e;background-color:#f9f2f4;border-radius:4px}kbd{padding:2px 4px;font-size:90%;color:#ffffff;background-color:#333333;border-radius:3px;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25)}kbd kbd{padding:0;font-size:100%;font-weight:bold;-webkit-box-shadow:none;box-shadow:none}pre{display:block;padding:9.5px;margin:0 0 10px;font-size:13px;line-height:1.42857143;word-break:break-all;word-wrap:break-word;color:#333333;background-color:#f5f5f5;border:1px solid #cccccc;border-radius:4px}pre code{padding:0;font-size:inherit;color:inherit;white-space:pre-wrap;background-color:transparent;border-radius:0}.pre-scrollable{max-height:340px;overflow-y:scroll}.container{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}@media (min-width:768px){.container{width:750px}}@media (min-width:992px){.container{width:970px}}@media (min-width:1200px){.container{width:1170px}}.container-fluid{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}.row{margin-left:-15px;margin-right:-15px}.col-xs-1,.col-sm-1,.col-md-1,.col-lg-1,.col-xs-2,.col-sm-2,.col-md-2,.col-lg-2,.col-xs-3,.col-sm-3,.col-md-3,.col-lg-3,.col-xs-4,.col-sm-4,.col-md-4,.col-lg-4,.col-xs-5,.col-sm-5,.col-md-5,.col-lg-5,.col-xs-6,.col-sm-6,.col-md-6,.col-lg-6,.col-xs-7,.col-sm-7,.col-md-7,.col-lg-7,.col-xs-8,.col-sm-8,.col-md-8,.col-lg-8,.col-xs-9,.col-sm-9,.col-md-9,.col-lg-9,.col-xs-10,.col-sm-10,.col-md-10,.col-lg-10,.col-xs-11,.col-sm-11,.col-md-11,.col-lg-11,.col-xs-12,.col-sm-12,.col-md-12,.col-lg-12{position:relative;min-height:1px;padding-left:15px;padding-right:15px}.col-xs-1,.col-xs-2,.col-xs-3,.col-xs-4,.col-xs-5,.col-xs-6,.col-xs-7,.col-xs-8,.col-xs-9,.col-xs-10,.col-xs-11,.col-xs-12{float:left}.col-xs-12{width:100%}.col-xs-11{width:91.66666667%}.col-xs-10{width:83.33333333%}.col-xs-9{width:75%}.col-xs-8{width:66.66666667%}.col-xs-7{width:58.33333333%}.col-xs-6{width:50%}.col-xs-5{width:41.66666667%}.col-xs-4{width:33.33333333%}.col-xs-3{width:25%}.col-xs-2{width:16.66666667%}.col-xs-1{width:8.33333333%}.col-xs-pull-12{right:100%}.col-xs-pull-11{right:91.66666667%}.col-xs-pull-10{right:83.33333333%}.col-xs-pull-9{right:75%}.col-xs-pull-8{right:66.66666667%}.col-xs-pull-7{right:58.33333333%}.col-xs-pull-6{right:50%}.col-xs-pull-5{right:41.66666667%}.col-xs-pull-4{right:33.33333333%}.col-xs-pull-3{right:25%}.col-xs-pull-2{right:16.66666667%}.col-xs-pull-1{right:8.33333333%}.col-xs-pull-0{right:auto}.col-xs-push-12{left:100%}.col-xs-push-11{left:91.66666667%}.col-xs-push-10{left:83.33333333%}.col-xs-push-9{left:75%}.col-xs-push-8{left:66.66666667%}.col-xs-push-7{left:58.33333333%}.col-xs-push-6{left:50%}.col-xs-push-5{left:41.66666667%}.col-xs-push-4{left:33.33333333%}.col-xs-push-3{left:25%}.col-xs-push-2{left:16.66666667%}.col-xs-push-1{left:8.33333333%}.col-xs-push-0{left:auto}.col-xs-offset-12{margin-left:100%}.col-xs-offset-11{margin-left:91.66666667%}.col-xs-offset-10{margin-left:83.33333333%}.col-xs-offset-9{margin-left:75%}.col-xs-offset-8{margin-left:66.66666667%}.col-xs-offset-7{margin-left:58.33333333%}.col-xs-offset-6{margin-left:50%}.col-xs-offset-5{margin-left:41.66666667%}.col-xs-offset-4{margin-left:33.33333333%}.col-xs-offset-3{margin-left:25%}.col-xs-offset-2{margin-left:16.66666667%}.col-xs-offset-1{margin-left:8.33333333%}.col-xs-offset-0{margin-left:0%}@media (min-width:768px){.col-sm-1,.col-sm-2,.col-sm-3,.col-sm-4,.col-sm-5,.col-sm-6,.col-sm-7,.col-sm-8,.col-sm-9,.col-sm-10,.col-sm-11,.col-sm-12{float:left}.col-sm-12{width:100%}.col-sm-11{width:91.66666667%}.col-sm-10{width:83.33333333%}.col-sm-9{width:75%}.col-sm-8{width:66.66666667%}.col-sm-7{width:58.33333333%}.col-sm-6{width:50%}.col-sm-5{width:41.66666667%}.col-sm-4{width:33.33333333%}.col-sm-3{width:25%}.col-sm-2{width:16.66666667%}.col-sm-1{width:8.33333333%}.col-sm-pull-12{right:100%}.col-sm-pull-11{right:91.66666667%}.col-sm-pull-10{right:83.33333333%}.col-sm-pull-9{right:75%}.col-sm-pull-8{right:66.66666667%}.col-sm-pull-7{right:58.33333333%}.col-sm-pull-6{right:50%}.col-sm-pull-5{right:41.66666667%}.col-sm-pull-4{right:33.33333333%}.col-sm-pull-3{right:25%}.col-sm-pull-2{right:16.66666667%}.col-sm-pull-1{right:8.33333333%}.col-sm-pull-0{right:auto}.col-sm-push-12{left:100%}.col-sm-push-11{left:91.66666667%}.col-sm-push-10{left:83.33333333%}.col-sm-push-9{left:75%}.col-sm-push-8{left:66.66666667%}.col-sm-push-7{left:58.33333333%}.col-sm-push-6{left:50%}.col-sm-push-5{left:41.66666667%}.col-sm-push-4{left:33.33333333%}.col-sm-push-3{left:25%}.col-sm-push-2{left:16.66666667%}.col-sm-push-1{left:8.33333333%}.col-sm-push-0{left:auto}.col-sm-offset-12{margin-left:100%}.col-sm-offset-11{margin-left:91.66666667%}.col-sm-offset-10{margin-left:83.33333333%}.col-sm-offset-9{margin-left:75%}.col-sm-offset-8{margin-left:66.66666667%}.col-sm-offset-7{margin-left:58.33333333%}.col-sm-offset-6{margin-left:50%}.col-sm-offset-5{margin-left:41.66666667%}.col-sm-offset-4{margin-left:33.33333333%}.col-sm-offset-3{margin-left:25%}.col-sm-offset-2{margin-left:16.66666667%}.col-sm-offset-1{margin-left:8.33333333%}.col-sm-offset-0{margin-left:0%}}@media (min-width:992px){.col-md-1,.col-md-2,.col-md-3,.col-md-4,.col-md-5,.col-md-6,.col-md-7,.col-md-8,.col-md-9,.col-md-10,.col-md-11,.col-md-12{float:left}.col-md-12{width:100%}.col-md-11{width:91.66666667%}.col-md-10{width:83.33333333%}.col-md-9{width:75%}.col-md-8{width:66.66666667%}.col-md-7{width:58.33333333%}.col-md-6{width:50%}.col-md-5{width:41.66666667%}.col-md-4{width:33.33333333%}.col-md-3{width:25%}.col-md-2{width:16.66666667%}.col-md-1{width:8.33333333%}.col-md-pull-12{right:100%}.col-md-pull-11{right:91.66666667%}.col-md-pull-10{right:83.33333333%}.col-md-pull-9{right:75%}.col-md-pull-8{right:66.66666667%}.col-md-pull-7{right:58.33333333%}.col-md-pull-6{right:50%}.col-md-pull-5{right:41.66666667%}.col-md-pull-4{right:33.33333333%}.col-md-pull-3{right:25%}.col-md-pull-2{right:16.66666667%}.col-md-pull-1{right:8.33333333%}.col-md-pull-0{right:auto}.col-md-push-12{left:100%}.col-md-push-11{left:91.66666667%}.col-md-push-10{left:83.33333333%}.col-md-push-9{left:75%}.col-md-push-8{left:66.66666667%}.col-md-push-7{left:58.33333333%}.col-md-push-6{left:50%}.col-md-push-5{left:41.66666667%}.col-md-push-4{left:33.33333333%}.col-md-push-3{left:25%}.col-md-push-2{left:16.66666667%}.col-md-push-1{left:8.33333333%}.col-md-push-0{left:auto}.col-md-offset-12{margin-left:100%}.col-md-offset-11{margin-left:91.66666667%}.col-md-offset-10{margin-left:83.33333333%}.col-md-offset-9{margin-left:75%}.col-md-offset-8{margin-left:66.66666667%}.col-md-offset-7{margin-left:58.33333333%}.col-md-offset-6{margin-left:50%}.col-md-offset-5{margin-left:41.66666667%}.col-md-offset-4{margin-left:33.33333333%}.col-md-offset-3{margin-left:25%}.col-md-offset-2{margin-left:16.66666667%}.col-md-offset-1{margin-left:8.33333333%}.col-md-offset-0{margin-left:0%}}@media (min-width:1200px){.col-lg-1,.col-lg-2,.col-lg-3,.col-lg-4,.col-lg-5,.col-lg-6,.col-lg-7,.col-lg-8,.col-lg-9,.col-lg-10,.col-lg-11,.col-lg-12{float:left}.col-lg-12{width:100%}.col-lg-11{width:91.66666667%}.col-lg-10{width:83.33333333%}.col-lg-9{width:75%}.col-lg-8{width:66.66666667%}.col-lg-7{width:58.33333333%}.col-lg-6{width:50%}.col-lg-5{width:41.66666667%}.col-lg-4{width:33.33333333%}.col-lg-3{width:25%}.col-lg-2{width:16.66666667%}.col-lg-1{width:8.33333333%}.col-lg-pull-12{right:100%}.col-lg-pull-11{right:91.66666667%}.col-lg-pull-10{right:83.33333333%}.col-lg-pull-9{right:75%}.col-lg-pull-8{right:66.66666667%}.col-lg-pull-7{right:58.33333333%}.col-lg-pull-6{right:50%}.col-lg-pull-5{right:41.66666667%}.col-lg-pull-4{right:33.33333333%}.col-lg-pull-3{right:25%}.col-lg-pull-2{right:16.66666667%}.col-lg-pull-1{right:8.33333333%}.col-lg-pull-0{right:auto}.col-lg-push-12{left:100%}.col-lg-push-11{left:91.66666667%}.col-lg-push-10{left:83.33333333%}.col-lg-push-9{left:75%}.col-lg-push-8{left:66.66666667%}.col-lg-push-7{left:58.33333333%}.col-lg-push-6{left:50%}.col-lg-push-5{left:41.66666667%}.col-lg-push-4{left:33.33333333%}.col-lg-push-3{left:25%}.col-lg-push-2{left:16.66666667%}.col-lg-push-1{left:8.33333333%}.col-lg-push-0{left:auto}.col-lg-offset-12{margin-left:100%}.col-lg-offset-11{margin-left:91.66666667%}.col-lg-offset-10{margin-left:83.33333333%}.col-lg-offset-9{margin-left:75%}.col-lg-offset-8{margin-left:66.66666667%}.col-lg-offset-7{margin-left:58.33333333%}.col-lg-offset-6{margin-left:50%}.col-lg-offset-5{margin-left:41.66666667%}.col-lg-offset-4{margin-left:33.33333333%}.col-lg-offset-3{margin-left:25%}.col-lg-offset-2{margin-left:16.66666667%}.col-lg-offset-1{margin-left:8.33333333%}.col-lg-offset-0{margin-left:0%}}table{background-color:transparent}caption{padding-top:8px;padding-bottom:8px;color:#999999;text-align:left}th{}.table{width:100%;max-width:100%;margin-bottom:20px}.table>thead>tr>th,.table>tbody>tr>th,.table>tfoot>tr>th,.table>thead>tr>td,.table>tbody>tr>td,.table>tfoot>tr>td{padding:8px;line-height:1.42857143;vertical-align:top;border-top:1px solid #dddddd}.table>thead>tr>th{vertical-align:bottom;border-bottom:2px solid #dddddd}.table>caption+thead>tr:first-child>th,.table>colgroup+thead>tr:first-child>th,.table>thead:first-child>tr:first-child>th,.table>caption+thead>tr:first-child>td,.table>colgroup+thead>tr:first-child>td,.table>thead:first-child>tr:first-child>td{border-top:0}.table>tbody+tbody{border-top:2px solid #dddddd}.table .table{background-color:#ffffff}.table-condensed>thead>tr>th,.table-condensed>tbody>tr>th,.table-condensed>tfoot>tr>th,.table-condensed>thead>tr>td,.table-condensed>tbody>tr>td,.table-condensed>tfoot>tr>td{padding:5px}.table-bordered{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>tbody>tr>th,.table-bordered>tfoot>tr>th,.table-bordered>thead>tr>td,.table-bordered>tbody>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>thead>tr>td{border-bottom-width:2px}.table-striped>tbody>tr:nth-child(odd){background-color:#f9f9f9}.table-hover>tbody>tr:hover{background-color:#f5f5f5}table col[class*="col-"]{position:static;float:none;display:table-column}table td[class*="col-"],table th[class*="col-"]{position:static;float:none;display:table-cell}.table>thead>tr>td.active,.table>tbody>tr>td.active,.table>tfoot>tr>td.active,.table>thead>tr>th.active,.table>tbody>tr>th.active,.table>tfoot>tr>th.active,.table>thead>tr.active>td,.table>tbody>tr.active>td,.table>tfoot>tr.active>td,.table>thead>tr.active>th,.table>tbody>tr.active>th,.table>tfoot>tr.active>th{background-color:#f5f5f5}.table-hover>tbody>tr>td.active:hover,.table-hover>tbody>tr>th.active:hover,.table-hover>tbody>tr.active:hover>td,.table-hover>tbody>tr:hover>.active,.table-hover>tbody>tr.active:hover>th{background-color:#e8e8e8}.table>thead>tr>td.success,.table>tbody>tr>td.success,.table>tfoot>tr>td.success,.table>thead>tr>th.success,.table>tbody>tr>th.success,.table>tfoot>tr>th.success,.table>thead>tr.success>td,.table>tbody>tr.success>td,.table>tfoot>tr.success>td,.table>thead>tr.success>th,.table>tbody>tr.success>th,.table>tfoot>tr.success>th{background-color:#dff0d8}.table-hover>tbody>tr>td.success:hover,.table-hover>tbody>tr>th.success:hover,.table-hover>tbody>tr.success:hover>td,.table-hover>tbody>tr:hover>.success,.table-hover>tbody>tr.success:hover>th{background-color:#d0e9c6}.table>thead>tr>td.info,.table>tbody>tr>td.info,.table>tfoot>tr>td.info,.table>thead>tr>th.info,.table>tbody>tr>th.info,.table>tfoot>tr>th.info,.table>thead>tr.info>td,.table>tbody>tr.info>td,.table>tfoot>tr.info>td,.table>thead>tr.info>th,.table>tbody>tr.info>th,.table>tfoot>tr.info>th{background-color:#d9edf7}.table-hover>tbody>tr>td.info:hover,.table-hover>tbody>tr>th.info:hover,.table-hover>tbody>tr.info:hover>td,.table-hover>tbody>tr:hover>.info,.table-hover>tbody>tr.info:hover>th{background-color:#c4e3f3}.table>thead>tr>td.warning,.table>tbody>tr>td.warning,.table>tfoot>tr>td.warning,.table>thead>tr>th.warning,.table>tbody>tr>th.warning,.table>tfoot>tr>th.warning,.table>thead>tr.warning>td,.table>tbody>tr.warning>td,.table>tfoot>tr.warning>td,.table>thead>tr.warning>th,.table>tbody>tr.warning>th,.table>tfoot>tr.warning>th{background-color:#fcf8e3}.table-hover>tbody>tr>td.warning:hover,.table-hover>tbody>tr>th.warning:hover,.table-hover>tbody>tr.warning:hover>td,.table-hover>tbody>tr:hover>.warning,.table-hover>tbody>tr.warning:hover>th{background-color:#faf2cc}.table>thead>tr>td.danger,.table>tbody>tr>td.danger,.table>tfoot>tr>td.danger,.table>thead>tr>th.danger,.table>tbody>tr>th.danger,.table>tfoot>tr>th.danger,.table>thead>tr.danger>td,.table>tbody>tr.danger>td,.table>tfoot>tr.danger>td,.table>thead>tr.danger>th,.table>tbody>tr.danger>th,.table>tfoot>tr.danger>th{background-color:#f2dede}.table-hover>tbody>tr>td.danger:hover,.table-hover>tbody>tr>th.danger:hover,.table-hover>tbody>tr.danger:hover>td,.table-hover>tbody>tr:hover>.danger,.table-hover>tbody>tr.danger:hover>th{background-color:#ebcccc}.table-responsive{overflow-x:auto;min-height:0.01%}@media screen and (max-width:767px){.table-responsive{width:100%;margin-bottom:15px;overflow-y:hidden;-ms-overflow-style:-ms-autohiding-scrollbar;border:1px solid #dddddd}.table-responsive>.table{margin-bottom:0}.table-responsive>.table>thead>tr>th,.table-responsive>.table>tbody>tr>th,.table-responsive>.table>tfoot>tr>th,.table-responsive>.table>thead>tr>td,.table-responsive>.table>tbody>tr>td,.table-responsive>.table>tfoot>tr>td{white-space:nowrap}.table-responsive>.table-bordered{border:0}.table-responsive>.table-bordered>thead>tr>th:first-child,.table-responsive>.table-bordered>tbody>tr>th:first-child,.table-responsive>.table-bordered>tfoot>tr>th:first-child,.table-responsive>.table-bordered>thead>tr>td:first-child,.table-responsive>.table-bordered>tbody>tr>td:first-child,.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.table-responsive>.table-bordered>thead>tr>th:last-child,.table-responsive>.table-bordered>tbody>tr>th:last-child,.table-responsive>.table-bordered>tfoot>tr>th:last-child,.table-responsive>.table-bordered>thead>tr>td:last-child,.table-responsive>.table-bordered>tbody>tr>td:last-child,.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.table-responsive>.table-bordered>tbody>tr:last-child>th,.table-responsive>.table-bordered>tfoot>tr:last-child>th,.table-responsive>.table-bordered>tbody>tr:last-child>td,.table-responsive>.table-bordered>tfoot>tr:last-child>td{border-bottom:0}}fieldset{padding:0;margin:0;border:0;min-width:0}legend{display:block;width:100%;padding:0;margin-bottom:20px;font-size:21px;line-height:inherit;color:#555555;border:0;border-bottom:1px solid #e5e5e5}label{display:inline-block;max-width:100%;margin-bottom:5px;font-weight:bold}input[type="search"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}input[type="radio"],input[type="checkbox"]{margin:4px 0 0;margin-top:1px \9;line-height:normal}input[type="file"]{display:block}input[type="range"]{display:block;width:100%}select[multiple],select[size]{height:auto}input[type="file"]:focus,input[type="radio"]:focus,input[type="checkbox"]:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}output{display:block;padding-top:9px;font-size:14px;line-height:1.42857143;color:#555555}.form-control{display:block;width:100%;height:38px;padding:8px 12px;font-size:14px;line-height:1.42857143;color:#555555;background-color:#ffffff;background-image:none;border:1px solid #cccccc;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);-webkit-transition:border-color ease-in-out .15s,-webkit-box-shadow ease-in-out .15s;-o-transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s;transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s}.form-control:focus{border-color:#66afe9;outline:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6)}.form-control::-moz-placeholder{color:#999999;opacity:1}.form-control:-ms-input-placeholder{color:#999999}.form-control::-webkit-input-placeholder{color:#999999}.form-control[disabled],.form-control[readonly],fieldset[disabled] .form-control{cursor:not-allowed;background-color:#eeeeee;opacity:1}textarea.form-control{height:auto}input[type="search"]{-webkit-appearance:none}@media screen and (-webkit-min-device-pixel-ratio:0){input[type="date"],input[type="time"],input[type="datetime-local"],input[type="month"]{line-height:38px}input[type="date"].input-sm,input[type="time"].input-sm,input[type="datetime-local"].input-sm,input[type="month"].input-sm{line-height:30px}input[type="date"].input-lg,input[type="time"].input-lg,input[type="datetime-local"].input-lg,input[type="month"].input-lg{line-height:54px}}.form-group{margin-bottom:15px}.radio,.checkbox{position:relative;display:block;margin-top:10px;margin-bottom:10px}.radio label,.checkbox label{min-height:20px;padding-left:20px;margin-bottom:0;font-weight:normal;cursor:pointer}.radio input[type="radio"],.radio-inline input[type="radio"],.checkbox input[type="checkbox"],.checkbox-inline input[type="checkbox"]{position:absolute;margin-left:-20px;margin-top:4px \9}.radio+.radio,.checkbox+.checkbox{margin-top:-5px}.radio-inline,.checkbox-inline{display:inline-block;padding-left:20px;margin-bottom:0;vertical-align:middle;font-weight:normal;cursor:pointer}.radio-inline+.radio-inline,.checkbox-inline+.checkbox-inline{margin-top:0;margin-left:10px}input[type="radio"][disabled],input[type="checkbox"][disabled],input[type="radio"].disabled,input[type="checkbox"].disabled,fieldset[disabled] input[type="radio"],fieldset[disabled] input[type="checkbox"]{cursor:not-allowed}.radio-inline.disabled,.checkbox-inline.disabled,fieldset[disabled] .radio-inline,fieldset[disabled] .checkbox-inline{cursor:not-allowed}.radio.disabled label,.checkbox.disabled label,fieldset[disabled] .radio label,fieldset[disabled] .checkbox label{cursor:not-allowed}.form-control-static{padding-top:9px;padding-bottom:9px;margin-bottom:0}.form-control-static.input-lg,.form-control-static.input-sm{padding-left:0;padding-right:0}.input-sm,.form-group-sm .form-control{height:30px;padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}select.input-sm,select.form-group-sm .form-control{height:30px;line-height:30px}textarea.input-sm,textarea.form-group-sm .form-control,select[multiple].input-sm,select[multiple].form-group-sm .form-control{height:auto}.input-lg,.form-group-lg .form-control{height:54px;padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}select.input-lg,select.form-group-lg .form-control{height:54px;line-height:54px}textarea.input-lg,textarea.form-group-lg .form-control,select[multiple].input-lg,select[multiple].form-group-lg .form-control{height:auto}.has-feedback{position:relative}.has-feedback .form-control{padding-right:47.5px}.form-control-feedback{position:absolute;top:0;right:0;z-index:2;display:block;width:38px;height:38px;line-height:38px;text-align:center;pointer-events:none}.input-lg+.form-control-feedback{width:54px;height:54px;line-height:54px}.input-sm+.form-control-feedback{width:30px;height:30px;line-height:30px}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success.radio label,.has-success.checkbox label,.has-success.radio-inline label,.has-success.checkbox-inline label{color:#468847}.has-success .form-control{border-color:#468847;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-success .form-control:focus{border-color:#356635;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #7aba7b;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #7aba7b}.has-success .input-group-addon{color:#468847;border-color:#468847;background-color:#dff0d8}.has-success .form-control-feedback{color:#468847}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning.radio label,.has-warning.checkbox label,.has-warning.radio-inline label,.has-warning.checkbox-inline label{color:#c09853}.has-warning .form-control{border-color:#c09853;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-warning .form-control:focus{border-color:#a47e3c;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #dbc59e;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #dbc59e}.has-warning .input-group-addon{color:#c09853;border-color:#c09853;background-color:#fcf8e3}.has-warning .form-control-feedback{color:#c09853}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error.radio label,.has-error.checkbox label,.has-error.radio-inline label,.has-error.checkbox-inline label{color:#b94a48}.has-error .form-control{border-color:#b94a48;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-error .form-control:focus{border-color:#953b39;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #d59392;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #d59392}.has-error .input-group-addon{color:#b94a48;border-color:#b94a48;background-color:#f2dede}.has-error .form-control-feedback{color:#b94a48}.has-feedback label~.form-control-feedback{top:25px}.has-feedback label.sr-only~.form-control-feedback{top:0}.help-block{display:block;margin-top:5px;margin-bottom:10px;color:#959595}@media (min-width:768px){.form-inline .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.form-inline .form-control{display:inline-block;width:auto;vertical-align:middle}.form-inline .form-control-static{display:inline-block}.form-inline .input-group{display:inline-table;vertical-align:middle}.form-inline .input-group .input-group-addon,.form-inline .input-group .input-group-btn,.form-inline .input-group .form-control{width:auto}.form-inline .input-group>.form-control{width:100%}.form-inline .control-label{margin-bottom:0;vertical-align:middle}.form-inline .radio,.form-inline .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.form-inline .radio label,.form-inline .checkbox label{padding-left:0}.form-inline .radio input[type="radio"],.form-inline .checkbox input[type="checkbox"]{position:relative;margin-left:0}.form-inline .has-feedback .form-control-feedback{top:0}}.form-horizontal .radio,.form-horizontal .checkbox,.form-horizontal .radio-inline,.form-horizontal .checkbox-inline{margin-top:0;margin-bottom:0;padding-top:9px}.form-horizontal .radio,.form-horizontal .checkbox{min-height:29px}.form-horizontal .form-group{margin-left:-15px;margin-right:-15px}@media (min-width:768px){.form-horizontal .control-label{text-align:right;margin-bottom:0;padding-top:9px}}.form-horizontal .has-feedback .form-control-feedback{right:15px}@media (min-width:768px){.form-horizontal .form-group-lg .control-label{padding-top:19.62px}}@media (min-width:768px){.form-horizontal .form-group-sm .control-label{padding-top:6px}}.btn{display:inline-block;margin-bottom:0;font-weight:normal;text-align:center;vertical-align:middle;-ms-touch-action:manipulation;touch-action:manipulation;cursor:pointer;background-image:none;border:1px solid transparent;white-space:nowrap;padding:8px 12px;font-size:14px;line-height:1.42857143;border-radius:4px;-webkit-user-select:none;-moz-user-select:none;-ms-user-select:none;user-select:none}.btn:focus,.btn:active:focus,.btn.active:focus,.btn.focus,.btn:active.focus,.btn.active.focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}.btn:hover,.btn:focus,.btn.focus{color:#555555;text-decoration:none}.btn:active,.btn.active{outline:0;background-image:none;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn.disabled,.btn[disabled],fieldset[disabled] .btn{cursor:not-allowed;pointer-events:none;opacity:0.65;filter:alpha(opacity=65);-webkit-box-shadow:none;box-shadow:none}.btn-default{color:#555555;background-color:#ffffff;border-color:rgba(0,0,0,0.1)}.btn-default:hover,.btn-default:focus,.btn-default.focus,.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{color:#555555;background-color:#e6e6e6;border-color:rgba(0,0,0,0.1)}.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{background-image:none}.btn-default.disabled,.btn-default[disabled],fieldset[disabled] .btn-default,.btn-default.disabled:hover,.btn-default[disabled]:hover,fieldset[disabled] .btn-default:hover,.btn-default.disabled:focus,.btn-default[disabled]:focus,fieldset[disabled] .btn-default:focus,.btn-default.disabled.focus,.btn-default[disabled].focus,fieldset[disabled] .btn-default.focus,.btn-default.disabled:active,.btn-default[disabled]:active,fieldset[disabled] .btn-default:active,.btn-default.disabled.active,.btn-default[disabled].active,fieldset[disabled] .btn-default.active{background-color:#ffffff;border-color:rgba(0,0,0,0.1)}.btn-default .badge{color:#ffffff;background-color:#555555}.btn-primary{color:#ffffff;background-color:#2fa4e7;border-color:#2fa4e7}.btn-primary:hover,.btn-primary:focus,.btn-primary.focus,.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{color:#ffffff;background-color:#178acc;border-color:#1684c2}.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{background-image:none}.btn-primary.disabled,.btn-primary[disabled],fieldset[disabled] .btn-primary,.btn-primary.disabled:hover,.btn-primary[disabled]:hover,fieldset[disabled] .btn-primary:hover,.btn-primary.disabled:focus,.btn-primary[disabled]:focus,fieldset[disabled] .btn-primary:focus,.btn-primary.disabled.focus,.btn-primary[disabled].focus,fieldset[disabled] .btn-primary.focus,.btn-primary.disabled:active,.btn-primary[disabled]:active,fieldset[disabled] .btn-primary:active,.btn-primary.disabled.active,.btn-primary[disabled].active,fieldset[disabled] .btn-primary.active{background-color:#2fa4e7;border-color:#2fa4e7}.btn-primary .badge{color:#2fa4e7;background-color:#ffffff}.btn-success{color:#ffffff;background-color:#73a839;border-color:#73a839}.btn-success:hover,.btn-success:focus,.btn-success.focus,.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{color:#ffffff;background-color:#59822c;border-color:#547a29}.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{background-image:none}.btn-success.disabled,.btn-success[disabled],fieldset[disabled] .btn-success,.btn-success.disabled:hover,.btn-success[disabled]:hover,fieldset[disabled] .btn-success:hover,.btn-success.disabled:focus,.btn-success[disabled]:focus,fieldset[disabled] .btn-success:focus,.btn-success.disabled.focus,.btn-success[disabled].focus,fieldset[disabled] .btn-success.focus,.btn-success.disabled:active,.btn-success[disabled]:active,fieldset[disabled] .btn-success:active,.btn-success.disabled.active,.btn-success[disabled].active,fieldset[disabled] .btn-success.active{background-color:#73a839;border-color:#73a839}.btn-success .badge{color:#73a839;background-color:#ffffff}.btn-info{color:#ffffff;background-color:#033c73;border-color:#033c73}.btn-info:hover,.btn-info:focus,.btn-info.focus,.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{color:#ffffff;background-color:#022241;border-color:#011d37}.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{background-image:none}.btn-info.disabled,.btn-info[disabled],fieldset[disabled] .btn-info,.btn-info.disabled:hover,.btn-info[disabled]:hover,fieldset[disabled] .btn-info:hover,.btn-info.disabled:focus,.btn-info[disabled]:focus,fieldset[disabled] .btn-info:focus,.btn-info.disabled.focus,.btn-info[disabled].focus,fieldset[disabled] .btn-info.focus,.btn-info.disabled:active,.btn-info[disabled]:active,fieldset[disabled] .btn-info:active,.btn-info.disabled.active,.btn-info[disabled].active,fieldset[disabled] .btn-info.active{background-color:#033c73;border-color:#033c73}.btn-info .badge{color:#033c73;background-color:#ffffff}.btn-warning{color:#ffffff;background-color:#dd5600;border-color:#dd5600}.btn-warning:hover,.btn-warning:focus,.btn-warning.focus,.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{color:#ffffff;background-color:#aa4200;border-color:#a03e00}.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{background-image:none}.btn-warning.disabled,.btn-warning[disabled],fieldset[disabled] .btn-warning,.btn-warning.disabled:hover,.btn-warning[disabled]:hover,fieldset[disabled] .btn-warning:hover,.btn-warning.disabled:focus,.btn-warning[disabled]:focus,fieldset[disabled] .btn-warning:focus,.btn-warning.disabled.focus,.btn-warning[disabled].focus,fieldset[disabled] .btn-warning.focus,.btn-warning.disabled:active,.btn-warning[disabled]:active,fieldset[disabled] .btn-warning:active,.btn-warning.disabled.active,.btn-warning[disabled].active,fieldset[disabled] .btn-warning.active{background-color:#dd5600;border-color:#dd5600}.btn-warning .badge{color:#dd5600;background-color:#ffffff}.btn-danger{color:#ffffff;background-color:#c71c22;border-color:#c71c22}.btn-danger:hover,.btn-danger:focus,.btn-danger.focus,.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{color:#ffffff;background-color:#9a161a;border-color:#911419}.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{background-image:none}.btn-danger.disabled,.btn-danger[disabled],fieldset[disabled] .btn-danger,.btn-danger.disabled:hover,.btn-danger[disabled]:hover,fieldset[disabled] .btn-danger:hover,.btn-danger.disabled:focus,.btn-danger[disabled]:focus,fieldset[disabled] .btn-danger:focus,.btn-danger.disabled.focus,.btn-danger[disabled].focus,fieldset[disabled] .btn-danger.focus,.btn-danger.disabled:active,.btn-danger[disabled]:active,fieldset[disabled] .btn-danger:active,.btn-danger.disabled.active,.btn-danger[disabled].active,fieldset[disabled] .btn-danger.active{background-color:#c71c22;border-color:#c71c22}.btn-danger .badge{color:#c71c22;background-color:#ffffff}.btn-link{color:#2fa4e7;font-weight:normal;border-radius:0}.btn-link,.btn-link:active,.btn-link.active,.btn-link[disabled],fieldset[disabled] .btn-link{background-color:transparent;-webkit-box-shadow:none;box-shadow:none}.btn-link,.btn-link:hover,.btn-link:focus,.btn-link:active{border-color:transparent}.btn-link:hover,.btn-link:focus{color:#157ab5;text-decoration:underline;background-color:transparent}.btn-link[disabled]:hover,fieldset[disabled] .btn-link:hover,.btn-link[disabled]:focus,fieldset[disabled] .btn-link:focus{color:#999999;text-decoration:none}.btn-lg,.btn-group-lg>.btn{padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}.btn-sm,.btn-group-sm>.btn{padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}.btn-xs,.btn-group-xs>.btn{padding:1px 5px;font-size:12px;line-height:1.5;border-radius:3px}.btn-block{display:block;width:100%}.btn-block+.btn-block{margin-top:5px}input[type="submit"].btn-block,input[type="reset"].btn-block,input[type="button"].btn-block{width:100%}.fade{opacity:0;-webkit-transition:opacity 0.15s linear;-o-transition:opacity 0.15s linear;transition:opacity 0.15s linear}.fade.in{opacity:1}.collapse{display:none;visibility:hidden}.collapse.in{display:block;visibility:visible}tr.collapse.in{display:table-row}tbody.collapse.in{display:table-row-group}.collapsing{position:relative;height:0;overflow:hidden;-webkit-transition-property:height, visibility;-o-transition-property:height, visibility;transition-property:height, visibility;-webkit-transition-duration:0.35s;-o-transition-duration:0.35s;transition-duration:0.35s;-webkit-transition-timing-function:ease;-o-transition-timing-function:ease;transition-timing-function:ease}.caret{display:inline-block;width:0;height:0;margin-left:2px;vertical-align:middle;border-top:4px solid;border-right:4px solid transparent;border-left:4px solid transparent}.dropdown{position:relative}.dropdown-toggle:focus{outline:0}.dropdown-menu{position:absolute;top:100%;left:0;z-index:1000;display:none;float:left;min-width:160px;padding:5px 0;margin:2px 0 0;list-style:none;font-size:14px;text-align:left;background-color:#ffffff;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.15);border-radius:4px;-webkit-box-shadow:0 6px 12px rgba(0,0,0,0.175);box-shadow:0 6px 12px rgba(0,0,0,0.175);-webkit-background-clip:padding-box;background-clip:padding-box}.dropdown-menu.pull-right{right:0;left:auto}.dropdown-menu .divider{height:1px;margin:9px 0;overflow:hidden;background-color:#e5e5e5}.dropdown-menu>li>a{display:block;padding:3px 20px;clear:both;font-weight:normal;line-height:1.42857143;color:#333333;white-space:nowrap}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{text-decoration:none;color:#ffffff;background-color:#2fa4e7}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{color:#ffffff;text-decoration:none;outline:0;background-color:#2fa4e7}.dropdown-menu>.disabled>a,.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{color:#999999}.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{text-decoration:none;background-color:transparent;background-image:none;filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);cursor:not-allowed}.open>.dropdown-menu{display:block}.open>a{outline:0}.dropdown-menu-right{left:auto;right:0}.dropdown-menu-left{left:0;right:auto}.dropdown-header{display:block;padding:3px 20px;font-size:12px;line-height:1.42857143;color:#999999;white-space:nowrap}.dropdown-backdrop{position:fixed;left:0;right:0;bottom:0;top:0;z-index:990}.pull-right>.dropdown-menu{right:0;left:auto}.dropup .caret,.navbar-fixed-bottom .dropdown .caret{border-top:0;border-bottom:4px solid;content:""}.dropup .dropdown-menu,.navbar-fixed-bottom .dropdown .dropdown-menu{top:auto;bottom:100%;margin-bottom:1px}@media (min-width:768px){.navbar-right .dropdown-menu{left:auto;right:0}.navbar-right .dropdown-menu-left{left:0;right:auto}}.btn-group,.btn-group-vertical{position:relative;display:inline-block;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;float:left}.btn-group>.btn:hover,.btn-group-vertical>.btn:hover,.btn-group>.btn:focus,.btn-group-vertical>.btn:focus,.btn-group>.btn:active,.btn-group-vertical>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn.active{z-index:2}.btn-group .btn+.btn,.btn-group .btn+.btn-group,.btn-group .btn-group+.btn,.btn-group .btn-group+.btn-group{margin-left:-1px}.btn-toolbar{margin-left:-5px}.btn-toolbar .btn-group,.btn-toolbar .input-group{float:left}.btn-toolbar>.btn,.btn-toolbar>.btn-group,.btn-toolbar>.input-group{margin-left:5px}.btn-group>.btn:not(:first-child):not(:last-child):not(.dropdown-toggle){border-radius:0}.btn-group>.btn:first-child{margin-left:0}.btn-group>.btn:first-child:not(:last-child):not(.dropdown-toggle){border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn:last-child:not(:first-child),.btn-group>.dropdown-toggle:not(:first-child){border-bottom-left-radius:0;border-top-left-radius:0}.btn-group>.btn-group{float:left}.btn-group>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group>.btn-group:first-child>.btn:last-child,.btn-group>.btn-group:first-child>.dropdown-toggle{border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn-group:last-child>.btn:first-child{border-bottom-left-radius:0;border-top-left-radius:0}.btn-group .dropdown-toggle:active,.btn-group.open .dropdown-toggle{outline:0}.btn-group>.btn+.dropdown-toggle{padding-left:8px;padding-right:8px}.btn-group>.btn-lg+.dropdown-toggle{padding-left:12px;padding-right:12px}.btn-group.open .dropdown-toggle{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn-group.open .dropdown-toggle.btn-link{-webkit-box-shadow:none;box-shadow:none}.btn .caret{margin-left:0}.btn-lg .caret{border-width:5px 5px 0;border-bottom-width:0}.dropup .btn-lg .caret{border-width:0 5px 5px}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group,.btn-group-vertical>.btn-group>.btn{display:block;float:none;width:100%;max-width:100%}.btn-group-vertical>.btn-group>.btn{float:none}.btn-group-vertical>.btn+.btn,.btn-group-vertical>.btn+.btn-group,.btn-group-vertical>.btn-group+.btn,.btn-group-vertical>.btn-group+.btn-group{margin-top:-1px;margin-left:0}.btn-group-vertical>.btn:not(:first-child):not(:last-child){border-radius:0}.btn-group-vertical>.btn:first-child:not(:last-child){border-top-right-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn:last-child:not(:first-child){border-bottom-left-radius:4px;border-top-right-radius:0;border-top-left-radius:0}.btn-group-vertical>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group-vertical>.btn-group:first-child:not(:last-child)>.btn:last-child,.btn-group-vertical>.btn-group:first-child:not(:last-child)>.dropdown-toggle{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn-group:last-child:not(:first-child)>.btn:first-child{border-top-right-radius:0;border-top-left-radius:0}.btn-group-justified{display:table;width:100%;table-layout:fixed;border-collapse:separate}.btn-group-justified>.btn,.btn-group-justified>.btn-group{float:none;display:table-cell;width:1%}.btn-group-justified>.btn-group .btn{width:100%}.btn-group-justified>.btn-group .dropdown-menu{left:auto}[data-toggle="buttons"]>.btn input[type="radio"],[data-toggle="buttons"]>.btn-group>.btn input[type="radio"],[data-toggle="buttons"]>.btn input[type="checkbox"],[data-toggle="buttons"]>.btn-group>.btn input[type="checkbox"]{position:absolute;clip:rect(0, 0, 0, 0);pointer-events:none}.input-group{position:relative;display:table;border-collapse:separate}.input-group[class*="col-"]{float:none;padding-left:0;padding-right:0}.input-group .form-control{position:relative;z-index:2;float:left;width:100%;margin-bottom:0}.input-group-lg>.form-control,.input-group-lg>.input-group-addon,.input-group-lg>.input-group-btn>.btn{height:54px;padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}select.input-group-lg>.form-control,select.input-group-lg>.input-group-addon,select.input-group-lg>.input-group-btn>.btn{height:54px;line-height:54px}textarea.input-group-lg>.form-control,textarea.input-group-lg>.input-group-addon,textarea.input-group-lg>.input-group-btn>.btn,select[multiple].input-group-lg>.form-control,select[multiple].input-group-lg>.input-group-addon,select[multiple].input-group-lg>.input-group-btn>.btn{height:auto}.input-group-sm>.form-control,.input-group-sm>.input-group-addon,.input-group-sm>.input-group-btn>.btn{height:30px;padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}select.input-group-sm>.form-control,select.input-group-sm>.input-group-addon,select.input-group-sm>.input-group-btn>.btn{height:30px;line-height:30px}textarea.input-group-sm>.form-control,textarea.input-group-sm>.input-group-addon,textarea.input-group-sm>.input-group-btn>.btn,select[multiple].input-group-sm>.form-control,select[multiple].input-group-sm>.input-group-addon,select[multiple].input-group-sm>.input-group-btn>.btn{height:auto}.input-group-addon,.input-group-btn,.input-group .form-control{display:table-cell}.input-group-addon:not(:first-child):not(:last-child),.input-group-btn:not(:first-child):not(:last-child),.input-group .form-control:not(:first-child):not(:last-child){border-radius:0}.input-group-addon,.input-group-btn{width:1%;white-space:nowrap;vertical-align:middle}.input-group-addon{padding:8px 12px;font-size:14px;font-weight:normal;line-height:1;color:#555555;text-align:center;background-color:#eeeeee;border:1px solid #cccccc;border-radius:4px}.input-group-addon.input-sm{padding:5px 10px;font-size:12px;border-radius:3px}.input-group-addon.input-lg{padding:14px 16px;font-size:18px;border-radius:6px}.input-group-addon input[type="radio"],.input-group-addon input[type="checkbox"]{margin-top:0}.input-group .form-control:first-child,.input-group-addon:first-child,.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group>.btn,.input-group-btn:first-child>.dropdown-toggle,.input-group-btn:last-child>.btn:not(:last-child):not(.dropdown-toggle),.input-group-btn:last-child>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-top-right-radius:0}.input-group-addon:first-child{border-right:0}.input-group .form-control:last-child,.input-group-addon:last-child,.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group>.btn,.input-group-btn:last-child>.dropdown-toggle,.input-group-btn:first-child>.btn:not(:first-child),.input-group-btn:first-child>.btn-group:not(:first-child)>.btn{border-bottom-left-radius:0;border-top-left-radius:0}.input-group-addon:last-child{border-left:0}.input-group-btn{position:relative;font-size:0;white-space:nowrap}.input-group-btn>.btn{position:relative}.input-group-btn>.btn+.btn{margin-left:-1px}.input-group-btn>.btn:hover,.input-group-btn>.btn:focus,.input-group-btn>.btn:active{z-index:2}.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group{margin-right:-1px}.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group{margin-left:-1px}.nav{margin-bottom:0;padding-left:0;list-style:none}.nav>li{position:relative;display:block}.nav>li>a{position:relative;display:block;padding:10px 15px}.nav>li>a:hover,.nav>li>a:focus{text-decoration:none;background-color:#eeeeee}.nav>li.disabled>a{color:#999999}.nav>li.disabled>a:hover,.nav>li.disabled>a:focus{color:#999999;text-decoration:none;background-color:transparent;cursor:not-allowed}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{background-color:#eeeeee;border-color:#2fa4e7}.nav .nav-divider{height:1px;margin:9px 0;overflow:hidden;background-color:#e5e5e5}.nav>li>a>img{max-width:none}.nav-tabs{border-bottom:1px solid #dddddd}.nav-tabs>li{float:left;margin-bottom:-1px}.nav-tabs>li>a{margin-right:2px;line-height:1.42857143;border:1px solid transparent;border-radius:4px 4px 0 0}.nav-tabs>li>a:hover{border-color:#eeeeee #eeeeee #dddddd}.nav-tabs>li.active>a,.nav-tabs>li.active>a:hover,.nav-tabs>li.active>a:focus{color:#555555;background-color:#ffffff;border:1px solid #dddddd;border-bottom-color:transparent;cursor:default}.nav-tabs.nav-justified{width:100%;border-bottom:0}.nav-tabs.nav-justified>li{float:none}.nav-tabs.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-tabs.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-tabs.nav-justified>li{display:table-cell;width:1%}.nav-tabs.nav-justified>li>a{margin-bottom:0}}.nav-tabs.nav-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs.nav-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border-bottom-color:#ffffff}}.nav-pills>li{float:left}.nav-pills>li>a{border-radius:4px}.nav-pills>li+li{margin-left:2px}.nav-pills>li.active>a,.nav-pills>li.active>a:hover,.nav-pills>li.active>a:focus{color:#ffffff;background-color:#2fa4e7}.nav-stacked>li{float:none}.nav-stacked>li+li{margin-top:2px;margin-left:0}.nav-justified{width:100%}.nav-justified>li{float:none}.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-justified>li{display:table-cell;width:1%}.nav-justified>li>a{margin-bottom:0}}.nav-tabs-justified{border-bottom:0}.nav-tabs-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border-bottom-color:#ffffff}}.tab-content>.tab-pane{display:none;visibility:hidden}.tab-content>.active{display:block;visibility:visible}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-right-radius:0;border-top-left-radius:0}.navbar{position:relative;min-height:50px;margin-bottom:20px;border:1px solid transparent}@media (min-width:768px){.navbar{border-radius:4px}}@media (min-width:768px){.navbar-header{float:left}}.navbar-collapse{overflow-x:visible;padding-right:15px;padding-left:15px;border-top:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);-webkit-overflow-scrolling:touch}.navbar-collapse.in{overflow-y:auto}@media (min-width:768px){.navbar-collapse{width:auto;border-top:0;-webkit-box-shadow:none;box-shadow:none}.navbar-collapse.collapse{display:block !important;visibility:visible !important;height:auto !important;padding-bottom:0;overflow:visible !important}.navbar-collapse.in{overflow-y:visible}.navbar-fixed-top .navbar-collapse,.navbar-static-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{padding-left:0;padding-right:0}}.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:340px}@media (max-device-width:480px) and (orientation:landscape){.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:200px}}.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:0;margin-left:0}}.navbar-static-top{z-index:1000;border-width:0 0 1px}@media (min-width:768px){.navbar-static-top{border-radius:0}}.navbar-fixed-top,.navbar-fixed-bottom{position:fixed;right:0;left:0;z-index:1030}@media (min-width:768px){.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}}.navbar-fixed-top{top:0;border-width:0 0 1px}.navbar-fixed-bottom{bottom:0;margin-bottom:0;border-width:1px 0 0}.navbar-brand{float:left;padding:15px 15px;font-size:18px;line-height:20px;height:50px}.navbar-brand:hover,.navbar-brand:focus{text-decoration:none}.navbar-brand>img{display:block}@media (min-width:768px){.navbar>.container .navbar-brand,.navbar>.container-fluid .navbar-brand{margin-left:-15px}}.navbar-toggle{position:relative;float:right;margin-right:15px;padding:9px 10px;margin-top:8px;margin-bottom:8px;background-color:transparent;background-image:none;border:1px solid transparent;border-radius:4px}.navbar-toggle:focus{outline:0}.navbar-toggle .icon-bar{display:block;width:22px;height:2px;border-radius:1px}.navbar-toggle .icon-bar+.icon-bar{margin-top:4px}@media (min-width:768px){.navbar-toggle{display:none}}.navbar-nav{margin:7.5px -15px}.navbar-nav>li>a{padding-top:10px;padding-bottom:10px;line-height:20px}@media (max-width:767px){.navbar-nav .open .dropdown-menu{position:static;float:none;width:auto;margin-top:0;background-color:transparent;border:0;-webkit-box-shadow:none;box-shadow:none}.navbar-nav .open .dropdown-menu>li>a,.navbar-nav .open .dropdown-menu .dropdown-header{padding:5px 15px 5px 25px}.navbar-nav .open .dropdown-menu>li>a{line-height:20px}.navbar-nav .open .dropdown-menu>li>a:hover,.navbar-nav .open .dropdown-menu>li>a:focus{background-image:none}}@media (min-width:768px){.navbar-nav{float:left;margin:0}.navbar-nav>li{float:left}.navbar-nav>li>a{padding-top:15px;padding-bottom:15px}}.navbar-form{margin-left:-15px;margin-right:-15px;padding:10px 15px;border-top:1px solid transparent;border-bottom:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);margin-top:6px;margin-bottom:6px}@media (min-width:768px){.navbar-form .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.navbar-form .form-control{display:inline-block;width:auto;vertical-align:middle}.navbar-form .form-control-static{display:inline-block}.navbar-form .input-group{display:inline-table;vertical-align:middle}.navbar-form .input-group .input-group-addon,.navbar-form .input-group .input-group-btn,.navbar-form .input-group .form-control{width:auto}.navbar-form .input-group>.form-control{width:100%}.navbar-form .control-label{margin-bottom:0;vertical-align:middle}.navbar-form .radio,.navbar-form .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.navbar-form .radio label,.navbar-form .checkbox label{padding-left:0}.navbar-form .radio input[type="radio"],.navbar-form .checkbox input[type="checkbox"]{position:relative;margin-left:0}.navbar-form .has-feedback .form-control-feedback{top:0}}@media (max-width:767px){.navbar-form .form-group{margin-bottom:5px}.navbar-form .form-group:last-child{margin-bottom:0}}@media (min-width:768px){.navbar-form{width:auto;border:0;margin-left:0;margin-right:0;padding-top:0;padding-bottom:0;-webkit-box-shadow:none;box-shadow:none}}.navbar-nav>li>.dropdown-menu{margin-top:0;border-top-right-radius:0;border-top-left-radius:0}.navbar-fixed-bottom .navbar-nav>li>.dropdown-menu{border-top-right-radius:4px;border-top-left-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.navbar-btn{margin-top:6px;margin-bottom:6px}.navbar-btn.btn-sm{margin-top:10px;margin-bottom:10px}.navbar-btn.btn-xs{margin-top:14px;margin-bottom:14px}.navbar-text{margin-top:15px;margin-bottom:15px}@media (min-width:768px){.navbar-text{float:left;margin-left:15px;margin-right:15px}}@media (min-width:768px){.navbar-left{float:left !important}.navbar-right{float:right !important;margin-right:-15px}.navbar-right~.navbar-right{margin-right:0}}.navbar-default{background-color:#2fa4e7;border-color:#1995dc}.navbar-default .navbar-brand{color:#ffffff}.navbar-default .navbar-brand:hover,.navbar-default .navbar-brand:focus{color:#ffffff;background-color:none}.navbar-default .navbar-text{color:#dddddd}.navbar-default .navbar-nav>li>a{color:#ffffff}.navbar-default .navbar-nav>li>a:hover,.navbar-default .navbar-nav>li>a:focus{color:#ffffff;background-color:#178acc}.navbar-default .navbar-nav>.active>a,.navbar-default .navbar-nav>.active>a:hover,.navbar-default .navbar-nav>.active>a:focus{color:#ffffff;background-color:#178acc}.navbar-default .navbar-nav>.disabled>a,.navbar-default .navbar-nav>.disabled>a:hover,.navbar-default .navbar-nav>.disabled>a:focus{color:#dddddd;background-color:transparent}.navbar-default .navbar-toggle{border-color:#178acc}.navbar-default .navbar-toggle:hover,.navbar-default .navbar-toggle:focus{background-color:#178acc}.navbar-default .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-default .navbar-collapse,.navbar-default .navbar-form{border-color:#1995dc}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.open>a:hover,.navbar-default .navbar-nav>.open>a:focus{background-color:#178acc;color:#ffffff}@media (max-width:767px){.navbar-default .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-default .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>li>a:focus{color:#ffffff;background-color:#178acc}.navbar-default .navbar-nav .open .dropdown-menu>.active>a,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#178acc}.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#dddddd;background-color:transparent}}.navbar-default .navbar-link{color:#ffffff}.navbar-default .navbar-link:hover{color:#ffffff}.navbar-default .btn-link{color:#ffffff}.navbar-default .btn-link:hover,.navbar-default .btn-link:focus{color:#ffffff}.navbar-default .btn-link[disabled]:hover,fieldset[disabled] .navbar-default .btn-link:hover,.navbar-default .btn-link[disabled]:focus,fieldset[disabled] .navbar-default .btn-link:focus{color:#dddddd}.navbar-inverse{background-color:#033c73;border-color:#022f5a}.navbar-inverse .navbar-brand{color:#ffffff}.navbar-inverse .navbar-brand:hover,.navbar-inverse .navbar-brand:focus{color:#ffffff;background-color:none}.navbar-inverse .navbar-text{color:#ffffff}.navbar-inverse .navbar-nav>li>a{color:#ffffff}.navbar-inverse .navbar-nav>li>a:hover,.navbar-inverse .navbar-nav>li>a:focus{color:#ffffff;background-color:#022f5a}.navbar-inverse .navbar-nav>.active>a,.navbar-inverse .navbar-nav>.active>a:hover,.navbar-inverse .navbar-nav>.active>a:focus{color:#ffffff;background-color:#022f5a}.navbar-inverse .navbar-nav>.disabled>a,.navbar-inverse .navbar-nav>.disabled>a:hover,.navbar-inverse .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-inverse .navbar-toggle{border-color:#022f5a}.navbar-inverse .navbar-toggle:hover,.navbar-inverse .navbar-toggle:focus{background-color:#022f5a}.navbar-inverse .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-inverse .navbar-collapse,.navbar-inverse .navbar-form{border-color:#022a50}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.open>a:hover,.navbar-inverse .navbar-nav>.open>a:focus{background-color:#022f5a;color:#ffffff}@media (max-width:767px){.navbar-inverse .navbar-nav .open .dropdown-menu>.dropdown-header{border-color:#022f5a}.navbar-inverse .navbar-nav .open .dropdown-menu .divider{background-color:#022f5a}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:focus{color:#ffffff;background-color:#022f5a}.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#022f5a}.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-inverse .navbar-link{color:#ffffff}.navbar-inverse .navbar-link:hover{color:#ffffff}.navbar-inverse .btn-link{color:#ffffff}.navbar-inverse .btn-link:hover,.navbar-inverse .btn-link:focus{color:#ffffff}.navbar-inverse .btn-link[disabled]:hover,fieldset[disabled] .navbar-inverse .btn-link:hover,.navbar-inverse .btn-link[disabled]:focus,fieldset[disabled] .navbar-inverse .btn-link:focus{color:#cccccc}.breadcrumb{padding:8px 15px;margin-bottom:20px;list-style:none;background-color:#f5f5f5;border-radius:4px}.breadcrumb>li{display:inline-block}.breadcrumb>li+li:before{content:"/\00a0";padding:0 5px;color:#cccccc}.breadcrumb>.active{color:#999999}.pagination{display:inline-block;padding-left:0;margin:20px 0;border-radius:4px}.pagination>li{display:inline}.pagination>li>a,.pagination>li>span{position:relative;float:left;padding:8px 12px;line-height:1.42857143;text-decoration:none;color:#2fa4e7;background-color:#ffffff;border:1px solid #dddddd;margin-left:-1px}.pagination>li:first-child>a,.pagination>li:first-child>span{margin-left:0;border-bottom-left-radius:4px;border-top-left-radius:4px}.pagination>li:last-child>a,.pagination>li:last-child>span{border-bottom-right-radius:4px;border-top-right-radius:4px}.pagination>li>a:hover,.pagination>li>span:hover,.pagination>li>a:focus,.pagination>li>span:focus{color:#157ab5;background-color:#eeeeee;border-color:#dddddd}.pagination>.active>a,.pagination>.active>span,.pagination>.active>a:hover,.pagination>.active>span:hover,.pagination>.active>a:focus,.pagination>.active>span:focus{z-index:2;color:#999999;background-color:#f5f5f5;border-color:#dddddd;cursor:default}.pagination>.disabled>span,.pagination>.disabled>span:hover,.pagination>.disabled>span:focus,.pagination>.disabled>a,.pagination>.disabled>a:hover,.pagination>.disabled>a:focus{color:#999999;background-color:#ffffff;border-color:#dddddd;cursor:not-allowed}.pagination-lg>li>a,.pagination-lg>li>span{padding:14px 16px;font-size:18px}.pagination-lg>li:first-child>a,.pagination-lg>li:first-child>span{border-bottom-left-radius:6px;border-top-left-radius:6px}.pagination-lg>li:last-child>a,.pagination-lg>li:last-child>span{border-bottom-right-radius:6px;border-top-right-radius:6px}.pagination-sm>li>a,.pagination-sm>li>span{padding:5px 10px;font-size:12px}.pagination-sm>li:first-child>a,.pagination-sm>li:first-child>span{border-bottom-left-radius:3px;border-top-left-radius:3px}.pagination-sm>li:last-child>a,.pagination-sm>li:last-child>span{border-bottom-right-radius:3px;border-top-right-radius:3px}.pager{padding-left:0;margin:20px 0;list-style:none;text-align:center}.pager li{display:inline}.pager li>a,.pager li>span{display:inline-block;padding:5px 14px;background-color:#ffffff;border:1px solid #dddddd;border-radius:15px}.pager li>a:hover,.pager li>a:focus{text-decoration:none;background-color:#eeeeee}.pager .next>a,.pager .next>span{float:right}.pager .previous>a,.pager .previous>span{float:left}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{color:#999999;background-color:#ffffff;cursor:not-allowed}.label{display:inline;padding:.2em .6em .3em;font-size:75%;font-weight:bold;line-height:1;color:#ffffff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25em}a.label:hover,a.label:focus{color:#ffffff;text-decoration:none;cursor:pointer}.label:empty{display:none}.btn .label{position:relative;top:-1px}.label-default{background-color:#999999}.label-default[href]:hover,.label-default[href]:focus{background-color:#808080}.label-primary{background-color:#2fa4e7}.label-primary[href]:hover,.label-primary[href]:focus{background-color:#178acc}.label-success{background-color:#73a839}.label-success[href]:hover,.label-success[href]:focus{background-color:#59822c}.label-info{background-color:#033c73}.label-info[href]:hover,.label-info[href]:focus{background-color:#022241}.label-warning{background-color:#dd5600}.label-warning[href]:hover,.label-warning[href]:focus{background-color:#aa4200}.label-danger{background-color:#c71c22}.label-danger[href]:hover,.label-danger[href]:focus{background-color:#9a161a}.badge{display:inline-block;min-width:10px;padding:3px 7px;font-size:12px;font-weight:bold;color:#ffffff;line-height:1;vertical-align:baseline;white-space:nowrap;text-align:center;background-color:#2fa4e7;border-radius:10px}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.btn-xs .badge{top:0;padding:1px 5px}a.badge:hover,a.badge:focus{color:#ffffff;text-decoration:none;cursor:pointer}.list-group-item.active>.badge,.nav-pills>.active>a>.badge{color:#2fa4e7;background-color:#ffffff}.list-group-item>.badge{float:right}.list-group-item>.badge+.badge{margin-right:5px}.nav-pills>li>a>.badge{margin-left:3px}.jumbotron{padding:30px 15px;margin-bottom:30px;color:inherit;background-color:#eeeeee}.jumbotron h1,.jumbotron .h1{color:inherit}.jumbotron p{margin-bottom:15px;font-size:21px;font-weight:200}.jumbotron>hr{border-top-color:#d5d5d5}.container .jumbotron,.container-fluid .jumbotron{border-radius:6px}.jumbotron .container{max-width:100%}@media screen and (min-width:768px){.jumbotron{padding:48px 0}.container .jumbotron,.container-fluid .jumbotron{padding-left:60px;padding-right:60px}.jumbotron h1,.jumbotron .h1{font-size:63px}}.thumbnail{display:block;padding:4px;margin-bottom:20px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:border .2s ease-in-out;-o-transition:border .2s ease-in-out;transition:border .2s ease-in-out}.thumbnail>img,.thumbnail a>img{margin-left:auto;margin-right:auto}a.thumbnail:hover,a.thumbnail:focus,a.thumbnail.active{border-color:#2fa4e7}.thumbnail .caption{padding:9px;color:#555555}.alert{padding:15px;margin-bottom:20px;border:1px solid transparent;border-radius:4px}.alert h4{margin-top:0;color:inherit}.alert .alert-link{font-weight:bold}.alert>p,.alert>ul{margin-bottom:0}.alert>p+p{margin-top:5px}.alert-dismissable,.alert-dismissible{padding-right:35px}.alert-dismissable .close,.alert-dismissible .close{position:relative;top:-2px;right:-21px;color:inherit}.alert-success{background-color:#dff0d8;border-color:#d6e9c6;color:#468847}.alert-success hr{border-top-color:#c9e2b3}.alert-success .alert-link{color:#356635}.alert-info{background-color:#d9edf7;border-color:#bce8f1;color:#3a87ad}.alert-info hr{border-top-color:#a6e1ec}.alert-info .alert-link{color:#2d6987}.alert-warning{background-color:#fcf8e3;border-color:#fbeed5;color:#c09853}.alert-warning hr{border-top-color:#f8e5be}.alert-warning .alert-link{color:#a47e3c}.alert-danger{background-color:#f2dede;border-color:#eed3d7;color:#b94a48}.alert-danger hr{border-top-color:#e6c1c7}.alert-danger .alert-link{color:#953b39}@-webkit-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@-o-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}.progress{overflow:hidden;height:20px;margin-bottom:20px;background-color:#f5f5f5;border-radius:4px;-webkit-box-shadow:inset 0 1px 2px rgba(0,0,0,0.1);box-shadow:inset 0 1px 2px rgba(0,0,0,0.1)}.progress-bar{float:left;width:0%;height:100%;font-size:12px;line-height:20px;color:#ffffff;text-align:center;background-color:#2fa4e7;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);-webkit-transition:width 0.6s ease;-o-transition:width 0.6s ease;transition:width 0.6s ease}.progress-striped .progress-bar,.progress-bar-striped{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);-webkit-background-size:40px 40px;background-size:40px 40px}.progress.active .progress-bar,.progress-bar.active{-webkit-animation:progress-bar-stripes 2s linear infinite;-o-animation:progress-bar-stripes 2s linear infinite;animation:progress-bar-stripes 2s linear infinite}.progress-bar-success{background-color:#73a839}.progress-striped .progress-bar-success{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-info{background-color:#033c73}.progress-striped .progress-bar-info{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-warning{background-color:#dd5600}.progress-striped .progress-bar-warning{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-danger{background-color:#c71c22}.progress-striped .progress-bar-danger{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.media{margin-top:15px}.media:first-child{margin-top:0}.media-right,.media>.pull-right{padding-left:10px}.media-left,.media>.pull-left{padding-right:10px}.media-left,.media-right,.media-body{display:table-cell;vertical-align:top}.media-middle{vertical-align:middle}.media-bottom{vertical-align:bottom}.media-heading{margin-top:0;margin-bottom:5px}.media-list{padding-left:0;list-style:none}.list-group{margin-bottom:20px;padding-left:0}.list-group-item{position:relative;display:block;padding:10px 15px;margin-bottom:-1px;background-color:#ffffff;border:1px solid #dddddd}.list-group-item:first-child{border-top-right-radius:4px;border-top-left-radius:4px}.list-group-item:last-child{margin-bottom:0;border-bottom-right-radius:4px;border-bottom-left-radius:4px}a.list-group-item{color:#555555}a.list-group-item .list-group-item-heading{color:#333333}a.list-group-item:hover,a.list-group-item:focus{text-decoration:none;color:#555555;background-color:#f5f5f5}.list-group-item.disabled,.list-group-item.disabled:hover,.list-group-item.disabled:focus{background-color:#eeeeee;color:#999999;cursor:not-allowed}.list-group-item.disabled .list-group-item-heading,.list-group-item.disabled:hover .list-group-item-heading,.list-group-item.disabled:focus .list-group-item-heading{color:inherit}.list-group-item.disabled .list-group-item-text,.list-group-item.disabled:hover .list-group-item-text,.list-group-item.disabled:focus .list-group-item-text{color:#999999}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{z-index:2;color:#ffffff;background-color:#2fa4e7;border-color:#2fa4e7}.list-group-item.active .list-group-item-heading,.list-group-item.active:hover .list-group-item-heading,.list-group-item.active:focus .list-group-item-heading,.list-group-item.active .list-group-item-heading>small,.list-group-item.active:hover .list-group-item-heading>small,.list-group-item.active:focus .list-group-item-heading>small,.list-group-item.active .list-group-item-heading>.small,.list-group-item.active:hover .list-group-item-heading>.small,.list-group-item.active:focus .list-group-item-heading>.small{color:inherit}.list-group-item.active .list-group-item-text,.list-group-item.active:hover .list-group-item-text,.list-group-item.active:focus .list-group-item-text{color:#e6f4fc}.list-group-item-success{color:#468847;background-color:#dff0d8}a.list-group-item-success{color:#468847}a.list-group-item-success .list-group-item-heading{color:inherit}a.list-group-item-success:hover,a.list-group-item-success:focus{color:#468847;background-color:#d0e9c6}a.list-group-item-success.active,a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{color:#fff;background-color:#468847;border-color:#468847}.list-group-item-info{color:#3a87ad;background-color:#d9edf7}a.list-group-item-info{color:#3a87ad}a.list-group-item-info .list-group-item-heading{color:inherit}a.list-group-item-info:hover,a.list-group-item-info:focus{color:#3a87ad;background-color:#c4e3f3}a.list-group-item-info.active,a.list-group-item-info.active:hover,a.list-group-item-info.active:focus{color:#fff;background-color:#3a87ad;border-color:#3a87ad}.list-group-item-warning{color:#c09853;background-color:#fcf8e3}a.list-group-item-warning{color:#c09853}a.list-group-item-warning .list-group-item-heading{color:inherit}a.list-group-item-warning:hover,a.list-group-item-warning:focus{color:#c09853;background-color:#faf2cc}a.list-group-item-warning.active,a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{color:#fff;background-color:#c09853;border-color:#c09853}.list-group-item-danger{color:#b94a48;background-color:#f2dede}a.list-group-item-danger{color:#b94a48}a.list-group-item-danger .list-group-item-heading{color:inherit}a.list-group-item-danger:hover,a.list-group-item-danger:focus{color:#b94a48;background-color:#ebcccc}a.list-group-item-danger.active,a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{color:#fff;background-color:#b94a48;border-color:#b94a48}.list-group-item-heading{margin-top:0;margin-bottom:5px}.list-group-item-text{margin-bottom:0;line-height:1.3}.panel{margin-bottom:20px;background-color:#ffffff;border:1px solid transparent;border-radius:4px;-webkit-box-shadow:0 1px 1px rgba(0,0,0,0.05);box-shadow:0 1px 1px rgba(0,0,0,0.05)}.panel-body{padding:15px}.panel-heading{padding:10px 15px;border-bottom:1px solid transparent;border-top-right-radius:3px;border-top-left-radius:3px}.panel-heading>.dropdown .dropdown-toggle{color:inherit}.panel-title{margin-top:0;margin-bottom:0;font-size:16px;color:inherit}.panel-title>a{color:inherit}.panel-footer{padding:10px 15px;background-color:#f5f5f5;border-top:1px solid #dddddd;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.list-group,.panel>.panel-collapse>.list-group{margin-bottom:0}.panel>.list-group .list-group-item,.panel>.panel-collapse>.list-group .list-group-item{border-width:1px 0;border-radius:0}.panel>.list-group:first-child .list-group-item:first-child,.panel>.panel-collapse>.list-group:first-child .list-group-item:first-child{border-top:0;border-top-right-radius:3px;border-top-left-radius:3px}.panel>.list-group:last-child .list-group-item:last-child,.panel>.panel-collapse>.list-group:last-child .list-group-item:last-child{border-bottom:0;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel-heading+.list-group .list-group-item:first-child{border-top-width:0}.list-group+.panel-footer{border-top-width:0}.panel>.table,.panel>.table-responsive>.table,.panel>.panel-collapse>.table{margin-bottom:0}.panel>.table caption,.panel>.table-responsive>.table caption,.panel>.panel-collapse>.table caption{padding-left:15px;padding-right:15px}.panel>.table:first-child,.panel>.table-responsive:first-child>.table:first-child{border-top-right-radius:3px;border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child{border-top-left-radius:3px;border-top-right-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:first-child{border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:last-child{border-top-right-radius:3px}.panel>.table:last-child,.panel>.table-responsive:last-child>.table:last-child{border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child{border-bottom-left-radius:3px;border-bottom-right-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:first-child{border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:last-child{border-bottom-right-radius:3px}.panel>.panel-body+.table,.panel>.panel-body+.table-responsive,.panel>.table+.panel-body,.panel>.table-responsive+.panel-body{border-top:1px solid #dddddd}.panel>.table>tbody:first-child>tr:first-child th,.panel>.table>tbody:first-child>tr:first-child td{border-top:0}.panel>.table-bordered,.panel>.table-responsive>.table-bordered{border:0}.panel>.table-bordered>thead>tr>th:first-child,.panel>.table-responsive>.table-bordered>thead>tr>th:first-child,.panel>.table-bordered>tbody>tr>th:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:first-child,.panel>.table-bordered>tfoot>tr>th:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:first-child,.panel>.table-bordered>thead>tr>td:first-child,.panel>.table-responsive>.table-bordered>thead>tr>td:first-child,.panel>.table-bordered>tbody>tr>td:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:first-child,.panel>.table-bordered>tfoot>tr>td:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.panel>.table-bordered>thead>tr>th:last-child,.panel>.table-responsive>.table-bordered>thead>tr>th:last-child,.panel>.table-bordered>tbody>tr>th:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:last-child,.panel>.table-bordered>tfoot>tr>th:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:last-child,.panel>.table-bordered>thead>tr>td:last-child,.panel>.table-responsive>.table-bordered>thead>tr>td:last-child,.panel>.table-bordered>tbody>tr>td:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:last-child,.panel>.table-bordered>tfoot>tr>td:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.panel>.table-bordered>thead>tr:first-child>td,.panel>.table-responsive>.table-bordered>thead>tr:first-child>td,.panel>.table-bordered>tbody>tr:first-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>td,.panel>.table-bordered>thead>tr:first-child>th,.panel>.table-responsive>.table-bordered>thead>tr:first-child>th,.panel>.table-bordered>tbody>tr:first-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>th{border-bottom:0}.panel>.table-bordered>tbody>tr:last-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>td,.panel>.table-bordered>tfoot>tr:last-child>td,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>td,.panel>.table-bordered>tbody>tr:last-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>th,.panel>.table-bordered>tfoot>tr:last-child>th,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>th{border-bottom:0}.panel>.table-responsive{border:0;margin-bottom:0}.panel-group{margin-bottom:20px}.panel-group .panel{margin-bottom:0;border-radius:4px}.panel-group .panel+.panel{margin-top:5px}.panel-group .panel-heading{border-bottom:0}.panel-group .panel-heading+.panel-collapse>.panel-body,.panel-group .panel-heading+.panel-collapse>.list-group{border-top:1px solid #dddddd}.panel-group .panel-footer{border-top:0}.panel-group .panel-footer+.panel-collapse .panel-body{border-bottom:1px solid #dddddd}.panel-default{border-color:#dddddd}.panel-default>.panel-heading{color:#555555;background-color:#f5f5f5;border-color:#dddddd}.panel-default>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-default>.panel-heading .badge{color:#f5f5f5;background-color:#555555}.panel-default>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-primary{border-color:#dddddd}.panel-primary>.panel-heading{color:#ffffff;background-color:#2fa4e7;border-color:#dddddd}.panel-primary>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-primary>.panel-heading .badge{color:#2fa4e7;background-color:#ffffff}.panel-primary>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-success{border-color:#dddddd}.panel-success>.panel-heading{color:#468847;background-color:#73a839;border-color:#dddddd}.panel-success>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-success>.panel-heading .badge{color:#73a839;background-color:#468847}.panel-success>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-info{border-color:#dddddd}.panel-info>.panel-heading{color:#3a87ad;background-color:#033c73;border-color:#dddddd}.panel-info>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-info>.panel-heading .badge{color:#033c73;background-color:#3a87ad}.panel-info>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-warning{border-color:#dddddd}.panel-warning>.panel-heading{color:#c09853;background-color:#dd5600;border-color:#dddddd}.panel-warning>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-warning>.panel-heading .badge{color:#dd5600;background-color:#c09853}.panel-warning>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-danger{border-color:#dddddd}.panel-danger>.panel-heading{color:#b94a48;background-color:#c71c22;border-color:#dddddd}.panel-danger>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-danger>.panel-heading .badge{color:#c71c22;background-color:#b94a48}.panel-danger>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.embed-responsive{position:relative;display:block;height:0;padding:0;overflow:hidden}.embed-responsive .embed-responsive-item,.embed-responsive iframe,.embed-responsive embed,.embed-responsive object,.embed-responsive video{position:absolute;top:0;left:0;bottom:0;height:100%;width:100%;border:0}.embed-responsive.embed-responsive-16by9{padding-bottom:56.25%}.embed-responsive.embed-responsive-4by3{padding-bottom:75%}.well{min-height:20px;padding:19px;margin-bottom:20px;background-color:#f5f5f5;border:1px solid #e3e3e3;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.05);box-shadow:inset 0 1px 1px rgba(0,0,0,0.05)}.well blockquote{border-color:#ddd;border-color:rgba(0,0,0,0.15)}.well-lg{padding:24px;border-radius:6px}.well-sm{padding:9px;border-radius:3px}.close{float:right;font-size:21px;font-weight:bold;line-height:1;color:#000000;text-shadow:0 1px 0 #ffffff;opacity:0.2;filter:alpha(opacity=20)}.close:hover,.close:focus{color:#000000;text-decoration:none;cursor:pointer;opacity:0.5;filter:alpha(opacity=50)}button.close{padding:0;cursor:pointer;background:transparent;border:0;-webkit-appearance:none}.modal-open{overflow:hidden}.modal{display:none;overflow:hidden;position:fixed;top:0;right:0;bottom:0;left:0;z-index:1040;-webkit-overflow-scrolling:touch;outline:0}.modal.fade .modal-dialog{-webkit-transform:translate(0, -25%);-ms-transform:translate(0, -25%);-o-transform:translate(0, -25%);transform:translate(0, -25%);-webkit-transition:-webkit-transform .3s ease-out;-o-transition:-o-transform .3s ease-out;transition:transform .3s ease-out}.modal.in .modal-dialog{-webkit-transform:translate(0, 0);-ms-transform:translate(0, 0);-o-transform:translate(0, 0);transform:translate(0, 0)}.modal-open .modal{overflow-x:hidden;overflow-y:auto}.modal-dialog{position:relative;width:auto;margin:10px}.modal-content{position:relative;background-color:#ffffff;border:1px solid #999999;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 3px 9px rgba(0,0,0,0.5);box-shadow:0 3px 9px rgba(0,0,0,0.5);-webkit-background-clip:padding-box;background-clip:padding-box;outline:0}.modal-backdrop{position:absolute;top:0;right:0;left:0;background-color:#000000}.modal-backdrop.fade{opacity:0;filter:alpha(opacity=0)}.modal-backdrop.in{opacity:0.5;filter:alpha(opacity=50)}.modal-header{padding:15px;border-bottom:1px solid #e5e5e5;min-height:16.42857143px}.modal-header .close{margin-top:-2px}.modal-title{margin:0;line-height:1.42857143}.modal-body{position:relative;padding:20px}.modal-footer{padding:20px;text-align:right;border-top:1px solid #e5e5e5}.modal-footer .btn+.btn{margin-left:5px;margin-bottom:0}.modal-footer .btn-group .btn+.btn{margin-left:-1px}.modal-footer .btn-block+.btn-block{margin-left:0}.modal-scrollbar-measure{position:absolute;top:-9999px;width:50px;height:50px;overflow:scroll}@media (min-width:768px){.modal-dialog{width:600px;margin:30px auto}.modal-content{-webkit-box-shadow:0 5px 15px rgba(0,0,0,0.5);box-shadow:0 5px 15px rgba(0,0,0,0.5)}.modal-sm{width:300px}}@media (min-width:992px){.modal-lg{width:900px}}.tooltip{position:absolute;z-index:1070;display:block;visibility:visible;font-family:"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:12px;font-weight:normal;line-height:1.4;opacity:0;filter:alpha(opacity=0)}.tooltip.in{opacity:0.9;filter:alpha(opacity=90)}.tooltip.top{margin-top:-3px;padding:5px 0}.tooltip.right{margin-left:3px;padding:0 5px}.tooltip.bottom{margin-top:3px;padding:5px 0}.tooltip.left{margin-left:-3px;padding:0 5px}.tooltip-inner{max-width:200px;padding:3px 8px;color:#ffffff;text-align:center;text-decoration:none;background-color:rgba(0,0,0,0.9);border-radius:4px}.tooltip-arrow{position:absolute;width:0;height:0;border-color:transparent;border-style:solid}.tooltip.top .tooltip-arrow{bottom:0;left:50%;margin-left:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-left .tooltip-arrow{bottom:0;right:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-right .tooltip-arrow{bottom:0;left:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.right .tooltip-arrow{top:50%;left:0;margin-top:-5px;border-width:5px 5px 5px 0;border-right-color:rgba(0,0,0,0.9)}.tooltip.left .tooltip-arrow{top:50%;right:0;margin-top:-5px;border-width:5px 0 5px 5px;border-left-color:rgba(0,0,0,0.9)}.tooltip.bottom .tooltip-arrow{top:0;left:50%;margin-left:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-left .tooltip-arrow{top:0;right:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-right .tooltip-arrow{top:0;left:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.popover{position:absolute;top:0;left:0;z-index:1060;display:none;max-width:276px;padding:1px;font-family:"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:14px;font-weight:normal;line-height:1.42857143;text-align:left;background-color:#ffffff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 5px 10px rgba(0,0,0,0.2);box-shadow:0 5px 10px rgba(0,0,0,0.2);white-space:normal}.popover.top{margin-top:-10px}.popover.right{margin-left:10px}.popover.bottom{margin-top:10px}.popover.left{margin-left:-10px}.popover-title{margin:0;padding:8px 14px;font-size:14px;background-color:#f7f7f7;border-bottom:1px solid #ebebeb;border-radius:5px 5px 0 0}.popover-content{padding:9px 14px}.popover>.arrow,.popover>.arrow:after{position:absolute;display:block;width:0;height:0;border-color:transparent;border-style:solid}.popover>.arrow{border-width:11px}.popover>.arrow:after{border-width:10px;content:""}.popover.top>.arrow{left:50%;margin-left:-11px;border-bottom-width:0;border-top-color:#999999;border-top-color:rgba(0,0,0,0.25);bottom:-11px}.popover.top>.arrow:after{content:" ";bottom:1px;margin-left:-10px;border-bottom-width:0;border-top-color:#ffffff}.popover.right>.arrow{top:50%;left:-11px;margin-top:-11px;border-left-width:0;border-right-color:#999999;border-right-color:rgba(0,0,0,0.25)}.popover.right>.arrow:after{content:" ";left:1px;bottom:-10px;border-left-width:0;border-right-color:#ffffff}.popover.bottom>.arrow{left:50%;margin-left:-11px;border-top-width:0;border-bottom-color:#999999;border-bottom-color:rgba(0,0,0,0.25);top:-11px}.popover.bottom>.arrow:after{content:" ";top:1px;margin-left:-10px;border-top-width:0;border-bottom-color:#ffffff}.popover.left>.arrow{top:50%;right:-11px;margin-top:-11px;border-right-width:0;border-left-color:#999999;border-left-color:rgba(0,0,0,0.25)}.popover.left>.arrow:after{content:" ";right:1px;border-right-width:0;border-left-color:#ffffff;bottom:-10px}.carousel{position:relative}.carousel-inner{position:relative;overflow:hidden;width:100%}.carousel-inner>.item{display:none;position:relative;-webkit-transition:.6s ease-in-out left;-o-transition:.6s ease-in-out left;transition:.6s ease-in-out left}.carousel-inner>.item>img,.carousel-inner>.item>a>img{line-height:1}@media all and (transform-3d),(-webkit-transform-3d){.carousel-inner>.item{-webkit-transition:-webkit-transform .6s ease-in-out;-o-transition:-o-transform .6s ease-in-out;transition:transform .6s ease-in-out;-webkit-backface-visibility:hidden;backface-visibility:hidden;-webkit-perspective:1000;perspective:1000}.carousel-inner>.item.next,.carousel-inner>.item.active.right{-webkit-transform:translate3d(100%, 0, 0);transform:translate3d(100%, 0, 0);left:0}.carousel-inner>.item.prev,.carousel-inner>.item.active.left{-webkit-transform:translate3d(-100%, 0, 0);transform:translate3d(-100%, 0, 0);left:0}.carousel-inner>.item.next.left,.carousel-inner>.item.prev.right,.carousel-inner>.item.active{-webkit-transform:translate3d(0, 0, 0);transform:translate3d(0, 0, 0);left:0}}.carousel-inner>.active,.carousel-inner>.next,.carousel-inner>.prev{display:block}.carousel-inner>.active{left:0}.carousel-inner>.next,.carousel-inner>.prev{position:absolute;top:0;width:100%}.carousel-inner>.next{left:100%}.carousel-inner>.prev{left:-100%}.carousel-inner>.next.left,.carousel-inner>.prev.right{left:0}.carousel-inner>.active.left{left:-100%}.carousel-inner>.active.right{left:100%}.carousel-control{position:absolute;top:0;left:0;bottom:0;width:15%;opacity:0.5;filter:alpha(opacity=50);font-size:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-control.left{background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.5)), to(rgba(0,0,0,0.0001)));background-image:linear-gradient(to right, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1)}.carousel-control.right{left:auto;right:0;background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.0001)), to(rgba(0,0,0,0.5)));background-image:linear-gradient(to right, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1)}.carousel-control:hover,.carousel-control:focus{outline:0;color:#ffffff;text-decoration:none;opacity:0.9;filter:alpha(opacity=90)}.carousel-control .icon-prev,.carousel-control .icon-next,.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right{position:absolute;top:50%;z-index:5;display:inline-block}.carousel-control .icon-prev,.carousel-control .glyphicon-chevron-left{left:50%;margin-left:-10px}.carousel-control .icon-next,.carousel-control .glyphicon-chevron-right{right:50%;margin-right:-10px}.carousel-control .icon-prev,.carousel-control .icon-next{width:20px;height:20px;margin-top:-10px;font-family:serif}.carousel-control .icon-prev:before{content:'\2039'}.carousel-control .icon-next:before{content:'\203a'}.carousel-indicators{position:absolute;bottom:10px;left:50%;z-index:15;width:60%;margin-left:-30%;padding-left:0;list-style:none;text-align:center}.carousel-indicators li{display:inline-block;width:10px;height:10px;margin:1px;text-indent:-999px;border:1px solid #ffffff;border-radius:10px;cursor:pointer;background-color:#000 \9;background-color:rgba(0,0,0,0)}.carousel-indicators .active{margin:0;width:12px;height:12px;background-color:#ffffff}.carousel-caption{position:absolute;left:15%;right:15%;bottom:20px;z-index:10;padding-top:20px;padding-bottom:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-caption .btn{text-shadow:none}@media screen and (min-width:768px){.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right,.carousel-control .icon-prev,.carousel-control .icon-next{width:30px;height:30px;margin-top:-15px;font-size:30px}.carousel-control .glyphicon-chevron-left,.carousel-control .icon-prev{margin-left:-15px}.carousel-control .glyphicon-chevron-right,.carousel-control .icon-next{margin-right:-15px}.carousel-caption{left:20%;right:20%;padding-bottom:30px}.carousel-indicators{bottom:20px}}.clearfix:before,.clearfix:after,.dl-horizontal dd:before,.dl-horizontal dd:after,.container:before,.container:after,.container-fluid:before,.container-fluid:after,.row:before,.row:after,.form-horizontal .form-group:before,.form-horizontal .form-group:after,.btn-toolbar:before,.btn-toolbar:after,.btn-group-vertical>.btn-group:before,.btn-group-vertical>.btn-group:after,.nav:before,.nav:after,.navbar:before,.navbar:after,.navbar-header:before,.navbar-header:after,.navbar-collapse:before,.navbar-collapse:after,.pager:before,.pager:after,.panel-body:before,.panel-body:after,.modal-footer:before,.modal-footer:after{content:" ";display:table}.clearfix:after,.dl-horizontal dd:after,.container:after,.container-fluid:after,.row:after,.form-horizontal .form-group:after,.btn-toolbar:after,.btn-group-vertical>.btn-group:after,.nav:after,.navbar:after,.navbar-header:after,.navbar-collapse:after,.pager:after,.panel-body:after,.modal-footer:after{clear:both}.center-block{display:block;margin-left:auto;margin-right:auto}.pull-right{float:right !important}.pull-left{float:left !important}.hide{display:none !important}.show{display:block !important}.invisible{visibility:hidden}.text-hide{font:0/0 a;color:transparent;text-shadow:none;background-color:transparent;border:0}.hidden{display:none !important;visibility:hidden !important}.affix{position:fixed}@-ms-viewport{width:device-width}.visible-xs,.visible-sm,.visible-md,.visible-lg{display:none !important}.visible-xs-block,.visible-xs-inline,.visible-xs-inline-block,.visible-sm-block,.visible-sm-inline,.visible-sm-inline-block,.visible-md-block,.visible-md-inline,.visible-md-inline-block,.visible-lg-block,.visible-lg-inline,.visible-lg-inline-block{display:none !important}@media (max-width:767px){.visible-xs{display:block !important}table.visible-xs{display:table}tr.visible-xs{display:table-row !important}th.visible-xs,td.visible-xs{display:table-cell !important}}@media (max-width:767px){.visible-xs-block{display:block !important}}@media (max-width:767px){.visible-xs-inline{display:inline !important}}@media (max-width:767px){.visible-xs-inline-block{display:inline-block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm{display:block !important}table.visible-sm{display:table}tr.visible-sm{display:table-row !important}th.visible-sm,td.visible-sm{display:table-cell !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-block{display:block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline{display:inline !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline-block{display:inline-block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md{display:block !important}table.visible-md{display:table}tr.visible-md{display:table-row !important}th.visible-md,td.visible-md{display:table-cell !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-block{display:block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline{display:inline !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline-block{display:inline-block !important}}@media (min-width:1200px){.visible-lg{display:block !important}table.visible-lg{display:table}tr.visible-lg{display:table-row !important}th.visible-lg,td.visible-lg{display:table-cell !important}}@media (min-width:1200px){.visible-lg-block{display:block !important}}@media (min-width:1200px){.visible-lg-inline{display:inline !important}}@media (min-width:1200px){.visible-lg-inline-block{display:inline-block !important}}@media (max-width:767px){.hidden-xs{display:none !important}}@media (min-width:768px) and (max-width:991px){.hidden-sm{display:none !important}}@media (min-width:992px) and (max-width:1199px){.hidden-md{display:none !important}}@media (min-width:1200px){.hidden-lg{display:none !important}}.visible-print{display:none !important}@media print{.visible-print{display:block !important}table.visible-print{display:table}tr.visible-print{display:table-row !important}th.visible-print,td.visible-print{display:table-cell !important}}.visible-print-block{display:none !important}@media print{.visible-print-block{display:block !important}}.visible-print-inline{display:none !important}@media print{.visible-print-inline{display:inline !important}}.visible-print-inline-block{display:none !important}@media print{.visible-print-inline-block{display:inline-block !important}}@media print{.hidden-print{display:none !important}}.navbar{background-image:-webkit-linear-gradient(#54b4eb, #2fa4e7 60%, #1d9ce5);background-image:-o-linear-gradient(#54b4eb, #2fa4e7 60%, #1d9ce5);background-image:-webkit-gradient(linear, left top, left bottom, from(#54b4eb), color-stop(60%, #2fa4e7), to(#1d9ce5));background-image:linear-gradient(#54b4eb, #2fa4e7 60%, #1d9ce5);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff54b4eb', endColorstr='#ff1d9ce5', GradientType=0);border-bottom:1px solid #178acc;-webkit-filter:none;filter:none;-webkit-box-shadow:0 1px 10px rgba(0,0,0,0.1);box-shadow:0 1px 10px rgba(0,0,0,0.1)}.navbar-default .badge{background-color:#fff;color:#2fa4e7}.navbar-inverse{background-image:-webkit-linear-gradient(#04519b, #044687 60%, #033769);background-image:-o-linear-gradient(#04519b, #044687 60%, #033769);background-image:-webkit-gradient(linear, left top, left bottom, from(#04519b), color-stop(60%, #044687), to(#033769));background-image:linear-gradient(#04519b, #044687 60%, #033769);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff04519b', endColorstr='#ff033769', GradientType=0);-webkit-filter:none;filter:none;border-bottom:1px solid #022241}.navbar-inverse .badge{background-color:#fff;color:#033c73}.navbar .navbar-nav>li>a,.navbar-brand{text-shadow:0 1px 0 rgba(0,0,0,0.1)}@media (max-width:767px){.navbar .dropdown-header{color:#fff}}.btn{text-shadow:0 1px 0 rgba(0,0,0,0.1)}.btn .caret{border-top-color:#fff}.btn-default{background-image:-webkit-linear-gradient(#fff, #fff 60%, #f5f5f5);background-image:-o-linear-gradient(#fff, #fff 60%, #f5f5f5);background-image:-webkit-gradient(linear, left top, left bottom, from(#fff), color-stop(60%, #fff), to(#f5f5f5));background-image:linear-gradient(#fff, #fff 60%, #f5f5f5);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffffffff', endColorstr='#fff5f5f5', GradientType=0);-webkit-filter:none;filter:none;border-bottom:1px solid #e6e6e6}.btn-default:hover{color:#555555}.btn-default .caret{border-top-color:#555555}.btn-default{background-image:-webkit-linear-gradient(#fff, #fff 60%, #f5f5f5);background-image:-o-linear-gradient(#fff, #fff 60%, #f5f5f5);background-image:-webkit-gradient(linear, left top, left bottom, from(#fff), color-stop(60%, #fff), to(#f5f5f5));background-image:linear-gradient(#fff, #fff 60%, #f5f5f5);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffffffff', endColorstr='#fff5f5f5', GradientType=0);-webkit-filter:none;filter:none;border-bottom:1px solid #e6e6e6}.btn-primary{background-image:-webkit-linear-gradient(#54b4eb, #2fa4e7 60%, #1d9ce5);background-image:-o-linear-gradient(#54b4eb, #2fa4e7 60%, #1d9ce5);background-image:-webkit-gradient(linear, left top, left bottom, from(#54b4eb), color-stop(60%, #2fa4e7), to(#1d9ce5));background-image:linear-gradient(#54b4eb, #2fa4e7 60%, #1d9ce5);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff54b4eb', endColorstr='#ff1d9ce5', GradientType=0);-webkit-filter:none;filter:none;border-bottom:1px solid #178acc}.btn-success{background-image:-webkit-linear-gradient(#88c149, #73a839 60%, #699934);background-image:-o-linear-gradient(#88c149, #73a839 60%, #699934);background-image:-webkit-gradient(linear, left top, left bottom, from(#88c149), color-stop(60%, #73a839), to(#699934));background-image:linear-gradient(#88c149, #73a839 60%, #699934);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff88c149', endColorstr='#ff699934', GradientType=0);-webkit-filter:none;filter:none;border-bottom:1px solid #59822c}.btn-info{background-image:-webkit-linear-gradient(#04519b, #033c73 60%, #02325f);background-image:-o-linear-gradient(#04519b, #033c73 60%, #02325f);background-image:-webkit-gradient(linear, left top, left bottom, from(#04519b), color-stop(60%, #033c73), to(#02325f));background-image:linear-gradient(#04519b, #033c73 60%, #02325f);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff04519b', endColorstr='#ff02325f', GradientType=0);-webkit-filter:none;filter:none;border-bottom:1px solid #022241}.btn-warning{background-image:-webkit-linear-gradient(#ff6707, #dd5600 60%, #c94e00);background-image:-o-linear-gradient(#ff6707, #dd5600 60%, #c94e00);background-image:-webkit-gradient(linear, left top, left bottom, from(#ff6707), color-stop(60%, #dd5600), to(#c94e00));background-image:linear-gradient(#ff6707, #dd5600 60%, #c94e00);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffff6707', endColorstr='#ffc94e00', GradientType=0);-webkit-filter:none;filter:none;border-bottom:1px solid #aa4200}.btn-danger{background-image:-webkit-linear-gradient(#e12b31, #c71c22 60%, #b5191f);background-image:-o-linear-gradient(#e12b31, #c71c22 60%, #b5191f);background-image:-webkit-gradient(linear, left top, left bottom, from(#e12b31), color-stop(60%, #c71c22), to(#b5191f));background-image:linear-gradient(#e12b31, #c71c22 60%, #b5191f);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffe12b31', endColorstr='#ffb5191f', GradientType=0);-webkit-filter:none;filter:none;border-bottom:1px solid #9a161a}.panel-primary .panel-heading,.panel-success .panel-heading,.panel-warning .panel-heading,.panel-danger .panel-heading,.panel-info .panel-heading,.panel-primary .panel-title,.panel-success .panel-title,.panel-warning .panel-title,.panel-danger .panel-title,.panel-info .panel-title{color:#fff} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/css/cosmo.min.css b/www/bootstrap-3.3.1/css/cosmo.min.css deleted file mode 100644 index ffcfded..0000000 --- a/www/bootstrap-3.3.1/css/cosmo.min.css +++ /dev/null @@ -1,26 +0,0 @@ -@font-face { - font-family: 'Source Sans Pro'; - font-style: normal; - font-weight: 300; - src: url(fonts/SourceSansProLight.ttf) format('truetype'); -} -@font-face { - font-family: 'Source Sans Pro'; - font-style: normal; - font-weight: 400; - src: url(fonts/SourceSansPro.ttf) format('truetype'); -} -@font-face { - font-family: 'Source Sans Pro'; - font-style: normal; - font-weight: 700; - src: url(fonts/SourceSansProBold.ttf) format('truetype'); -} - -/*! - * bootswatch v3.3.1+1 - * Homepage: http://bootswatch.com - * Copyright 2012-2014 Thomas Park - * Licensed under MIT - * Based on Bootstrap -*//*! normalize.css v3.0.2 | MIT License | git.io/normalize */html{font-family:sans-serif;-ms-text-size-adjust:100%;-webkit-text-size-adjust:100%}body{margin:0}article,aside,details,figcaption,figure,footer,header,hgroup,main,menu,nav,section,summary{display:block}audio,canvas,progress,video{display:inline-block;vertical-align:baseline}audio:not([controls]){display:none;height:0}[hidden],template{display:none}a{background-color:transparent}a:active,a:hover{outline:0}abbr[title]{border-bottom:1px dotted}b,strong{font-weight:bold}dfn{font-style:italic}h1{font-size:2em;margin:0.67em 0}mark{background:#ff0;color:#000}small{font-size:80%}sub,sup{font-size:75%;line-height:0;position:relative;vertical-align:baseline}sup{top:-0.5em}sub{bottom:-0.25em}img{border:0}svg:not(:root){overflow:hidden}figure{margin:1em 40px}hr{-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box;height:0}pre{overflow:auto}code,kbd,pre,samp{font-family:monospace, monospace;font-size:1em}button,input,optgroup,select,textarea{color:inherit;font:inherit;margin:0}button{overflow:visible}button,select{text-transform:none}button,html input[type="button"],input[type="reset"],input[type="submit"]{-webkit-appearance:button;cursor:pointer}button[disabled],html input[disabled]{cursor:default}button::-moz-focus-inner,input::-moz-focus-inner{border:0;padding:0}input{line-height:normal}input[type="checkbox"],input[type="radio"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box;padding:0}input[type="number"]::-webkit-inner-spin-button,input[type="number"]::-webkit-outer-spin-button{height:auto}input[type="search"]{-webkit-appearance:textfield;-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box}input[type="search"]::-webkit-search-cancel-button,input[type="search"]::-webkit-search-decoration{-webkit-appearance:none}fieldset{border:1px solid #c0c0c0;margin:0 2px;padding:0.35em 0.625em 0.75em}legend{border:0;padding:0}textarea{overflow:auto}optgroup{font-weight:bold}table{border-collapse:collapse;border-spacing:0}td,th{padding:0}/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */@media print{*,*:before,*:after{background:transparent !important;color:#000 !important;-webkit-box-shadow:none !important;box-shadow:none !important;text-shadow:none !important}a,a:visited{text-decoration:underline}a[href]:after{content:" (" attr(href) ")"}abbr[title]:after{content:" (" attr(title) ")"}a[href^="#"]:after,a[href^="javascript:"]:after{content:""}pre,blockquote{border:1px solid #999;page-break-inside:avoid}thead{display:table-header-group}tr,img{page-break-inside:avoid}img{max-width:100% !important}p,h2,h3{orphans:3;widows:3}h2,h3{page-break-after:avoid}select{background:#fff !important}.navbar{display:none}.btn>.caret,.dropup>.btn>.caret{border-top-color:#000 !important}.label{border:1px solid #000}.table{border-collapse:collapse !important}.table td,.table th{background-color:#fff !important}.table-bordered th,.table-bordered td{border:1px solid #ddd !important}}@font-face{font-family:'Glyphicons Halflings';src:url('../fonts/glyphicons-halflings-regular.eot');src:url('../fonts/glyphicons-halflings-regular.eot?#iefix') format('embedded-opentype'),url('../fonts/glyphicons-halflings-regular.woff') format('woff'),url('../fonts/glyphicons-halflings-regular.ttf') format('truetype'),url('../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular') format('svg')}.glyphicon{position:relative;top:1px;display:inline-block;font-family:'Glyphicons Halflings';font-style:normal;font-weight:normal;line-height:1;-webkit-font-smoothing:antialiased;-moz-osx-font-smoothing:grayscale}.glyphicon-asterisk:before{content:"\2a"}.glyphicon-plus:before{content:"\2b"}.glyphicon-euro:before,.glyphicon-eur:before{content:"\20ac"}.glyphicon-minus:before{content:"\2212"}.glyphicon-cloud:before{content:"\2601"}.glyphicon-envelope:before{content:"\2709"}.glyphicon-pencil:before{content:"\270f"}.glyphicon-glass:before{content:"\e001"}.glyphicon-music:before{content:"\e002"}.glyphicon-search:before{content:"\e003"}.glyphicon-heart:before{content:"\e005"}.glyphicon-star:before{content:"\e006"}.glyphicon-star-empty:before{content:"\e007"}.glyphicon-user:before{content:"\e008"}.glyphicon-film:before{content:"\e009"}.glyphicon-th-large:before{content:"\e010"}.glyphicon-th:before{content:"\e011"}.glyphicon-th-list:before{content:"\e012"}.glyphicon-ok:before{content:"\e013"}.glyphicon-remove:before{content:"\e014"}.glyphicon-zoom-in:before{content:"\e015"}.glyphicon-zoom-out:before{content:"\e016"}.glyphicon-off:before{content:"\e017"}.glyphicon-signal:before{content:"\e018"}.glyphicon-cog:before{content:"\e019"}.glyphicon-trash:before{content:"\e020"}.glyphicon-home:before{content:"\e021"}.glyphicon-file:before{content:"\e022"}.glyphicon-time:before{content:"\e023"}.glyphicon-road:before{content:"\e024"}.glyphicon-download-alt:before{content:"\e025"}.glyphicon-download:before{content:"\e026"}.glyphicon-upload:before{content:"\e027"}.glyphicon-inbox:before{content:"\e028"}.glyphicon-play-circle:before{content:"\e029"}.glyphicon-repeat:before{content:"\e030"}.glyphicon-refresh:before{content:"\e031"}.glyphicon-list-alt:before{content:"\e032"}.glyphicon-lock:before{content:"\e033"}.glyphicon-flag:before{content:"\e034"}.glyphicon-headphones:before{content:"\e035"}.glyphicon-volume-off:before{content:"\e036"}.glyphicon-volume-down:before{content:"\e037"}.glyphicon-volume-up:before{content:"\e038"}.glyphicon-qrcode:before{content:"\e039"}.glyphicon-barcode:before{content:"\e040"}.glyphicon-tag:before{content:"\e041"}.glyphicon-tags:before{content:"\e042"}.glyphicon-book:before{content:"\e043"}.glyphicon-bookmark:before{content:"\e044"}.glyphicon-print:before{content:"\e045"}.glyphicon-camera:before{content:"\e046"}.glyphicon-font:before{content:"\e047"}.glyphicon-bold:before{content:"\e048"}.glyphicon-italic:before{content:"\e049"}.glyphicon-text-height:before{content:"\e050"}.glyphicon-text-width:before{content:"\e051"}.glyphicon-align-left:before{content:"\e052"}.glyphicon-align-center:before{content:"\e053"}.glyphicon-align-right:before{content:"\e054"}.glyphicon-align-justify:before{content:"\e055"}.glyphicon-list:before{content:"\e056"}.glyphicon-indent-left:before{content:"\e057"}.glyphicon-indent-right:before{content:"\e058"}.glyphicon-facetime-video:before{content:"\e059"}.glyphicon-picture:before{content:"\e060"}.glyphicon-map-marker:before{content:"\e062"}.glyphicon-adjust:before{content:"\e063"}.glyphicon-tint:before{content:"\e064"}.glyphicon-edit:before{content:"\e065"}.glyphicon-share:before{content:"\e066"}.glyphicon-check:before{content:"\e067"}.glyphicon-move:before{content:"\e068"}.glyphicon-step-backward:before{content:"\e069"}.glyphicon-fast-backward:before{content:"\e070"}.glyphicon-backward:before{content:"\e071"}.glyphicon-play:before{content:"\e072"}.glyphicon-pause:before{content:"\e073"}.glyphicon-stop:before{content:"\e074"}.glyphicon-forward:before{content:"\e075"}.glyphicon-fast-forward:before{content:"\e076"}.glyphicon-step-forward:before{content:"\e077"}.glyphicon-eject:before{content:"\e078"}.glyphicon-chevron-left:before{content:"\e079"}.glyphicon-chevron-right:before{content:"\e080"}.glyphicon-plus-sign:before{content:"\e081"}.glyphicon-minus-sign:before{content:"\e082"}.glyphicon-remove-sign:before{content:"\e083"}.glyphicon-ok-sign:before{content:"\e084"}.glyphicon-question-sign:before{content:"\e085"}.glyphicon-info-sign:before{content:"\e086"}.glyphicon-screenshot:before{content:"\e087"}.glyphicon-remove-circle:before{content:"\e088"}.glyphicon-ok-circle:before{content:"\e089"}.glyphicon-ban-circle:before{content:"\e090"}.glyphicon-arrow-left:before{content:"\e091"}.glyphicon-arrow-right:before{content:"\e092"}.glyphicon-arrow-up:before{content:"\e093"}.glyphicon-arrow-down:before{content:"\e094"}.glyphicon-share-alt:before{content:"\e095"}.glyphicon-resize-full:before{content:"\e096"}.glyphicon-resize-small:before{content:"\e097"}.glyphicon-exclamation-sign:before{content:"\e101"}.glyphicon-gift:before{content:"\e102"}.glyphicon-leaf:before{content:"\e103"}.glyphicon-fire:before{content:"\e104"}.glyphicon-eye-open:before{content:"\e105"}.glyphicon-eye-close:before{content:"\e106"}.glyphicon-warning-sign:before{content:"\e107"}.glyphicon-plane:before{content:"\e108"}.glyphicon-calendar:before{content:"\e109"}.glyphicon-random:before{content:"\e110"}.glyphicon-comment:before{content:"\e111"}.glyphicon-magnet:before{content:"\e112"}.glyphicon-chevron-up:before{content:"\e113"}.glyphicon-chevron-down:before{content:"\e114"}.glyphicon-retweet:before{content:"\e115"}.glyphicon-shopping-cart:before{content:"\e116"}.glyphicon-folder-close:before{content:"\e117"}.glyphicon-folder-open:before{content:"\e118"}.glyphicon-resize-vertical:before{content:"\e119"}.glyphicon-resize-horizontal:before{content:"\e120"}.glyphicon-hdd:before{content:"\e121"}.glyphicon-bullhorn:before{content:"\e122"}.glyphicon-bell:before{content:"\e123"}.glyphicon-certificate:before{content:"\e124"}.glyphicon-thumbs-up:before{content:"\e125"}.glyphicon-thumbs-down:before{content:"\e126"}.glyphicon-hand-right:before{content:"\e127"}.glyphicon-hand-left:before{content:"\e128"}.glyphicon-hand-up:before{content:"\e129"}.glyphicon-hand-down:before{content:"\e130"}.glyphicon-circle-arrow-right:before{content:"\e131"}.glyphicon-circle-arrow-left:before{content:"\e132"}.glyphicon-circle-arrow-up:before{content:"\e133"}.glyphicon-circle-arrow-down:before{content:"\e134"}.glyphicon-globe:before{content:"\e135"}.glyphicon-wrench:before{content:"\e136"}.glyphicon-tasks:before{content:"\e137"}.glyphicon-filter:before{content:"\e138"}.glyphicon-briefcase:before{content:"\e139"}.glyphicon-fullscreen:before{content:"\e140"}.glyphicon-dashboard:before{content:"\e141"}.glyphicon-paperclip:before{content:"\e142"}.glyphicon-heart-empty:before{content:"\e143"}.glyphicon-link:before{content:"\e144"}.glyphicon-phone:before{content:"\e145"}.glyphicon-pushpin:before{content:"\e146"}.glyphicon-usd:before{content:"\e148"}.glyphicon-gbp:before{content:"\e149"}.glyphicon-sort:before{content:"\e150"}.glyphicon-sort-by-alphabet:before{content:"\e151"}.glyphicon-sort-by-alphabet-alt:before{content:"\e152"}.glyphicon-sort-by-order:before{content:"\e153"}.glyphicon-sort-by-order-alt:before{content:"\e154"}.glyphicon-sort-by-attributes:before{content:"\e155"}.glyphicon-sort-by-attributes-alt:before{content:"\e156"}.glyphicon-unchecked:before{content:"\e157"}.glyphicon-expand:before{content:"\e158"}.glyphicon-collapse-down:before{content:"\e159"}.glyphicon-collapse-up:before{content:"\e160"}.glyphicon-log-in:before{content:"\e161"}.glyphicon-flash:before{content:"\e162"}.glyphicon-log-out:before{content:"\e163"}.glyphicon-new-window:before{content:"\e164"}.glyphicon-record:before{content:"\e165"}.glyphicon-save:before{content:"\e166"}.glyphicon-open:before{content:"\e167"}.glyphicon-saved:before{content:"\e168"}.glyphicon-import:before{content:"\e169"}.glyphicon-export:before{content:"\e170"}.glyphicon-send:before{content:"\e171"}.glyphicon-floppy-disk:before{content:"\e172"}.glyphicon-floppy-saved:before{content:"\e173"}.glyphicon-floppy-remove:before{content:"\e174"}.glyphicon-floppy-save:before{content:"\e175"}.glyphicon-floppy-open:before{content:"\e176"}.glyphicon-credit-card:before{content:"\e177"}.glyphicon-transfer:before{content:"\e178"}.glyphicon-cutlery:before{content:"\e179"}.glyphicon-header:before{content:"\e180"}.glyphicon-compressed:before{content:"\e181"}.glyphicon-earphone:before{content:"\e182"}.glyphicon-phone-alt:before{content:"\e183"}.glyphicon-tower:before{content:"\e184"}.glyphicon-stats:before{content:"\e185"}.glyphicon-sd-video:before{content:"\e186"}.glyphicon-hd-video:before{content:"\e187"}.glyphicon-subtitles:before{content:"\e188"}.glyphicon-sound-stereo:before{content:"\e189"}.glyphicon-sound-dolby:before{content:"\e190"}.glyphicon-sound-5-1:before{content:"\e191"}.glyphicon-sound-6-1:before{content:"\e192"}.glyphicon-sound-7-1:before{content:"\e193"}.glyphicon-copyright-mark:before{content:"\e194"}.glyphicon-registration-mark:before{content:"\e195"}.glyphicon-cloud-download:before{content:"\e197"}.glyphicon-cloud-upload:before{content:"\e198"}.glyphicon-tree-conifer:before{content:"\e199"}.glyphicon-tree-deciduous:before{content:"\e200"}*{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}*:before,*:after{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}html{font-size:10px;-webkit-tap-highlight-color:rgba(0,0,0,0)}body{font-family:"Source Sans Pro",Calibri,Candara,Arial,sans-serif;font-size:15px;line-height:1.42857143;color:#333333;background-color:#ffffff}input,button,select,textarea{font-family:inherit;font-size:inherit;line-height:inherit}a{color:#2780e3;text-decoration:none}a:hover,a:focus{color:#165ba8;text-decoration:underline}a:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}figure{margin:0}img{vertical-align:middle}.img-responsive,.thumbnail>img,.thumbnail a>img,.carousel-inner>.item>img,.carousel-inner>.item>a>img{display:block;max-width:100%;height:auto}.img-rounded{border-radius:0}.img-thumbnail{padding:4px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:0;-webkit-transition:all .2s ease-in-out;-o-transition:all .2s ease-in-out;transition:all .2s ease-in-out;display:inline-block;max-width:100%;height:auto}.img-circle{border-radius:50%}hr{margin-top:21px;margin-bottom:21px;border:0;border-top:1px solid #e6e6e6}.sr-only{position:absolute;width:1px;height:1px;margin:-1px;padding:0;overflow:hidden;clip:rect(0, 0, 0, 0);border:0}.sr-only-focusable:active,.sr-only-focusable:focus{position:static;width:auto;height:auto;margin:0;overflow:visible;clip:auto}h1,h2,h3,h4,h5,h6,.h1,.h2,.h3,.h4,.h5,.h6{font-family:"Source Sans Pro",Calibri,Candara,Arial,sans-serif;font-weight:300;line-height:1.1;color:inherit}h1 small,h2 small,h3 small,h4 small,h5 small,h6 small,.h1 small,.h2 small,.h3 small,.h4 small,.h5 small,.h6 small,h1 .small,h2 .small,h3 .small,h4 .small,h5 .small,h6 .small,.h1 .small,.h2 .small,.h3 .small,.h4 .small,.h5 .small,.h6 .small{font-weight:normal;line-height:1;color:#999999}h1,.h1,h2,.h2,h3,.h3{margin-top:21px;margin-bottom:10.5px}h1 small,.h1 small,h2 small,.h2 small,h3 small,.h3 small,h1 .small,.h1 .small,h2 .small,.h2 .small,h3 .small,.h3 .small{font-size:65%}h4,.h4,h5,.h5,h6,.h6{margin-top:10.5px;margin-bottom:10.5px}h4 small,.h4 small,h5 small,.h5 small,h6 small,.h6 small,h4 .small,.h4 .small,h5 .small,.h5 .small,h6 .small,.h6 .small{font-size:75%}h1,.h1{font-size:39px}h2,.h2{font-size:32px}h3,.h3{font-size:26px}h4,.h4{font-size:19px}h5,.h5{font-size:15px}h6,.h6{font-size:13px}p{margin:0 0 10.5px}.lead{margin-bottom:21px;font-size:17px;font-weight:300;line-height:1.4}@media (min-width:768px){.lead{font-size:22.5px}}small,.small{font-size:86%}mark,.mark{background-color:#ff7518;padding:.2em}.text-left{text-align:left}.text-right{text-align:right}.text-center{text-align:center}.text-justify{text-align:justify}.text-nowrap{white-space:nowrap}.text-lowercase{text-transform:lowercase}.text-uppercase{text-transform:uppercase}.text-capitalize{text-transform:capitalize}.text-muted{color:#999999}.text-primary{color:#2780e3}a.text-primary:hover{color:#1967be}.text-success{color:#ffffff}a.text-success:hover{color:#e6e6e6}.text-info{color:#ffffff}a.text-info:hover{color:#e6e6e6}.text-warning{color:#ffffff}a.text-warning:hover{color:#e6e6e6}.text-danger{color:#ffffff}a.text-danger:hover{color:#e6e6e6}.bg-primary{color:#fff;background-color:#2780e3}a.bg-primary:hover{background-color:#1967be}.bg-success{background-color:#3fb618}a.bg-success:hover{background-color:#2f8912}.bg-info{background-color:#9954bb}a.bg-info:hover{background-color:#7e3f9d}.bg-warning{background-color:#ff7518}a.bg-warning:hover{background-color:#e45c00}.bg-danger{background-color:#ff0039}a.bg-danger:hover{background-color:#cc002e}.page-header{padding-bottom:9.5px;margin:42px 0 21px;border-bottom:1px solid #e6e6e6}ul,ol{margin-top:0;margin-bottom:10.5px}ul ul,ol ul,ul ol,ol ol{margin-bottom:0}.list-unstyled{padding-left:0;list-style:none}.list-inline{padding-left:0;list-style:none;margin-left:-5px}.list-inline>li{display:inline-block;padding-left:5px;padding-right:5px}dl{margin-top:0;margin-bottom:21px}dt,dd{line-height:1.42857143}dt{font-weight:bold}dd{margin-left:0}@media (min-width:768px){.dl-horizontal dt{float:left;width:160px;clear:left;text-align:right;overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.dl-horizontal dd{margin-left:180px}}abbr[title],abbr[data-original-title]{cursor:help;border-bottom:1px dotted #999999}.initialism{font-size:90%;text-transform:uppercase}blockquote{padding:10.5px 21px;margin:0 0 21px;font-size:18.75px;border-left:5px solid #e6e6e6}blockquote p:last-child,blockquote ul:last-child,blockquote ol:last-child{margin-bottom:0}blockquote footer,blockquote small,blockquote .small{display:block;font-size:80%;line-height:1.42857143;color:#999999}blockquote footer:before,blockquote small:before,blockquote .small:before{content:'\2014 \00A0'}.blockquote-reverse,blockquote.pull-right{padding-right:15px;padding-left:0;border-right:5px solid #e6e6e6;border-left:0;text-align:right}.blockquote-reverse footer:before,blockquote.pull-right footer:before,.blockquote-reverse small:before,blockquote.pull-right small:before,.blockquote-reverse .small:before,blockquote.pull-right .small:before{content:''}.blockquote-reverse footer:after,blockquote.pull-right footer:after,.blockquote-reverse small:after,blockquote.pull-right small:after,.blockquote-reverse .small:after,blockquote.pull-right .small:after{content:'\00A0 \2014'}address{margin-bottom:21px;font-style:normal;line-height:1.42857143}code,kbd,pre,samp{font-family:monospace}code{padding:2px 4px;font-size:90%;color:#c7254e;background-color:#f9f2f4;border-radius:0}kbd{padding:2px 4px;font-size:90%;color:#ffffff;background-color:#333333;border-radius:0;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25)}kbd kbd{padding:0;font-size:100%;font-weight:bold;-webkit-box-shadow:none;box-shadow:none}pre{display:block;padding:10px;margin:0 0 10.5px;font-size:14px;line-height:1.42857143;word-break:break-all;word-wrap:break-word;color:#333333;background-color:#f5f5f5;border:1px solid #cccccc;border-radius:0}pre code{padding:0;font-size:inherit;color:inherit;white-space:pre-wrap;background-color:transparent;border-radius:0}.pre-scrollable{max-height:340px;overflow-y:scroll}.container{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}@media (min-width:768px){.container{width:750px}}@media (min-width:992px){.container{width:970px}}@media (min-width:1200px){.container{width:1170px}}.container-fluid{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}.row{margin-left:-15px;margin-right:-15px}.col-xs-1,.col-sm-1,.col-md-1,.col-lg-1,.col-xs-2,.col-sm-2,.col-md-2,.col-lg-2,.col-xs-3,.col-sm-3,.col-md-3,.col-lg-3,.col-xs-4,.col-sm-4,.col-md-4,.col-lg-4,.col-xs-5,.col-sm-5,.col-md-5,.col-lg-5,.col-xs-6,.col-sm-6,.col-md-6,.col-lg-6,.col-xs-7,.col-sm-7,.col-md-7,.col-lg-7,.col-xs-8,.col-sm-8,.col-md-8,.col-lg-8,.col-xs-9,.col-sm-9,.col-md-9,.col-lg-9,.col-xs-10,.col-sm-10,.col-md-10,.col-lg-10,.col-xs-11,.col-sm-11,.col-md-11,.col-lg-11,.col-xs-12,.col-sm-12,.col-md-12,.col-lg-12{position:relative;min-height:1px;padding-left:15px;padding-right:15px}.col-xs-1,.col-xs-2,.col-xs-3,.col-xs-4,.col-xs-5,.col-xs-6,.col-xs-7,.col-xs-8,.col-xs-9,.col-xs-10,.col-xs-11,.col-xs-12{float:left}.col-xs-12{width:100%}.col-xs-11{width:91.66666667%}.col-xs-10{width:83.33333333%}.col-xs-9{width:75%}.col-xs-8{width:66.66666667%}.col-xs-7{width:58.33333333%}.col-xs-6{width:50%}.col-xs-5{width:41.66666667%}.col-xs-4{width:33.33333333%}.col-xs-3{width:25%}.col-xs-2{width:16.66666667%}.col-xs-1{width:8.33333333%}.col-xs-pull-12{right:100%}.col-xs-pull-11{right:91.66666667%}.col-xs-pull-10{right:83.33333333%}.col-xs-pull-9{right:75%}.col-xs-pull-8{right:66.66666667%}.col-xs-pull-7{right:58.33333333%}.col-xs-pull-6{right:50%}.col-xs-pull-5{right:41.66666667%}.col-xs-pull-4{right:33.33333333%}.col-xs-pull-3{right:25%}.col-xs-pull-2{right:16.66666667%}.col-xs-pull-1{right:8.33333333%}.col-xs-pull-0{right:auto}.col-xs-push-12{left:100%}.col-xs-push-11{left:91.66666667%}.col-xs-push-10{left:83.33333333%}.col-xs-push-9{left:75%}.col-xs-push-8{left:66.66666667%}.col-xs-push-7{left:58.33333333%}.col-xs-push-6{left:50%}.col-xs-push-5{left:41.66666667%}.col-xs-push-4{left:33.33333333%}.col-xs-push-3{left:25%}.col-xs-push-2{left:16.66666667%}.col-xs-push-1{left:8.33333333%}.col-xs-push-0{left:auto}.col-xs-offset-12{margin-left:100%}.col-xs-offset-11{margin-left:91.66666667%}.col-xs-offset-10{margin-left:83.33333333%}.col-xs-offset-9{margin-left:75%}.col-xs-offset-8{margin-left:66.66666667%}.col-xs-offset-7{margin-left:58.33333333%}.col-xs-offset-6{margin-left:50%}.col-xs-offset-5{margin-left:41.66666667%}.col-xs-offset-4{margin-left:33.33333333%}.col-xs-offset-3{margin-left:25%}.col-xs-offset-2{margin-left:16.66666667%}.col-xs-offset-1{margin-left:8.33333333%}.col-xs-offset-0{margin-left:0%}@media (min-width:768px){.col-sm-1,.col-sm-2,.col-sm-3,.col-sm-4,.col-sm-5,.col-sm-6,.col-sm-7,.col-sm-8,.col-sm-9,.col-sm-10,.col-sm-11,.col-sm-12{float:left}.col-sm-12{width:100%}.col-sm-11{width:91.66666667%}.col-sm-10{width:83.33333333%}.col-sm-9{width:75%}.col-sm-8{width:66.66666667%}.col-sm-7{width:58.33333333%}.col-sm-6{width:50%}.col-sm-5{width:41.66666667%}.col-sm-4{width:33.33333333%}.col-sm-3{width:25%}.col-sm-2{width:16.66666667%}.col-sm-1{width:8.33333333%}.col-sm-pull-12{right:100%}.col-sm-pull-11{right:91.66666667%}.col-sm-pull-10{right:83.33333333%}.col-sm-pull-9{right:75%}.col-sm-pull-8{right:66.66666667%}.col-sm-pull-7{right:58.33333333%}.col-sm-pull-6{right:50%}.col-sm-pull-5{right:41.66666667%}.col-sm-pull-4{right:33.33333333%}.col-sm-pull-3{right:25%}.col-sm-pull-2{right:16.66666667%}.col-sm-pull-1{right:8.33333333%}.col-sm-pull-0{right:auto}.col-sm-push-12{left:100%}.col-sm-push-11{left:91.66666667%}.col-sm-push-10{left:83.33333333%}.col-sm-push-9{left:75%}.col-sm-push-8{left:66.66666667%}.col-sm-push-7{left:58.33333333%}.col-sm-push-6{left:50%}.col-sm-push-5{left:41.66666667%}.col-sm-push-4{left:33.33333333%}.col-sm-push-3{left:25%}.col-sm-push-2{left:16.66666667%}.col-sm-push-1{left:8.33333333%}.col-sm-push-0{left:auto}.col-sm-offset-12{margin-left:100%}.col-sm-offset-11{margin-left:91.66666667%}.col-sm-offset-10{margin-left:83.33333333%}.col-sm-offset-9{margin-left:75%}.col-sm-offset-8{margin-left:66.66666667%}.col-sm-offset-7{margin-left:58.33333333%}.col-sm-offset-6{margin-left:50%}.col-sm-offset-5{margin-left:41.66666667%}.col-sm-offset-4{margin-left:33.33333333%}.col-sm-offset-3{margin-left:25%}.col-sm-offset-2{margin-left:16.66666667%}.col-sm-offset-1{margin-left:8.33333333%}.col-sm-offset-0{margin-left:0%}}@media (min-width:992px){.col-md-1,.col-md-2,.col-md-3,.col-md-4,.col-md-5,.col-md-6,.col-md-7,.col-md-8,.col-md-9,.col-md-10,.col-md-11,.col-md-12{float:left}.col-md-12{width:100%}.col-md-11{width:91.66666667%}.col-md-10{width:83.33333333%}.col-md-9{width:75%}.col-md-8{width:66.66666667%}.col-md-7{width:58.33333333%}.col-md-6{width:50%}.col-md-5{width:41.66666667%}.col-md-4{width:33.33333333%}.col-md-3{width:25%}.col-md-2{width:16.66666667%}.col-md-1{width:8.33333333%}.col-md-pull-12{right:100%}.col-md-pull-11{right:91.66666667%}.col-md-pull-10{right:83.33333333%}.col-md-pull-9{right:75%}.col-md-pull-8{right:66.66666667%}.col-md-pull-7{right:58.33333333%}.col-md-pull-6{right:50%}.col-md-pull-5{right:41.66666667%}.col-md-pull-4{right:33.33333333%}.col-md-pull-3{right:25%}.col-md-pull-2{right:16.66666667%}.col-md-pull-1{right:8.33333333%}.col-md-pull-0{right:auto}.col-md-push-12{left:100%}.col-md-push-11{left:91.66666667%}.col-md-push-10{left:83.33333333%}.col-md-push-9{left:75%}.col-md-push-8{left:66.66666667%}.col-md-push-7{left:58.33333333%}.col-md-push-6{left:50%}.col-md-push-5{left:41.66666667%}.col-md-push-4{left:33.33333333%}.col-md-push-3{left:25%}.col-md-push-2{left:16.66666667%}.col-md-push-1{left:8.33333333%}.col-md-push-0{left:auto}.col-md-offset-12{margin-left:100%}.col-md-offset-11{margin-left:91.66666667%}.col-md-offset-10{margin-left:83.33333333%}.col-md-offset-9{margin-left:75%}.col-md-offset-8{margin-left:66.66666667%}.col-md-offset-7{margin-left:58.33333333%}.col-md-offset-6{margin-left:50%}.col-md-offset-5{margin-left:41.66666667%}.col-md-offset-4{margin-left:33.33333333%}.col-md-offset-3{margin-left:25%}.col-md-offset-2{margin-left:16.66666667%}.col-md-offset-1{margin-left:8.33333333%}.col-md-offset-0{margin-left:0%}}@media (min-width:1200px){.col-lg-1,.col-lg-2,.col-lg-3,.col-lg-4,.col-lg-5,.col-lg-6,.col-lg-7,.col-lg-8,.col-lg-9,.col-lg-10,.col-lg-11,.col-lg-12{float:left}.col-lg-12{width:100%}.col-lg-11{width:91.66666667%}.col-lg-10{width:83.33333333%}.col-lg-9{width:75%}.col-lg-8{width:66.66666667%}.col-lg-7{width:58.33333333%}.col-lg-6{width:50%}.col-lg-5{width:41.66666667%}.col-lg-4{width:33.33333333%}.col-lg-3{width:25%}.col-lg-2{width:16.66666667%}.col-lg-1{width:8.33333333%}.col-lg-pull-12{right:100%}.col-lg-pull-11{right:91.66666667%}.col-lg-pull-10{right:83.33333333%}.col-lg-pull-9{right:75%}.col-lg-pull-8{right:66.66666667%}.col-lg-pull-7{right:58.33333333%}.col-lg-pull-6{right:50%}.col-lg-pull-5{right:41.66666667%}.col-lg-pull-4{right:33.33333333%}.col-lg-pull-3{right:25%}.col-lg-pull-2{right:16.66666667%}.col-lg-pull-1{right:8.33333333%}.col-lg-pull-0{right:auto}.col-lg-push-12{left:100%}.col-lg-push-11{left:91.66666667%}.col-lg-push-10{left:83.33333333%}.col-lg-push-9{left:75%}.col-lg-push-8{left:66.66666667%}.col-lg-push-7{left:58.33333333%}.col-lg-push-6{left:50%}.col-lg-push-5{left:41.66666667%}.col-lg-push-4{left:33.33333333%}.col-lg-push-3{left:25%}.col-lg-push-2{left:16.66666667%}.col-lg-push-1{left:8.33333333%}.col-lg-push-0{left:auto}.col-lg-offset-12{margin-left:100%}.col-lg-offset-11{margin-left:91.66666667%}.col-lg-offset-10{margin-left:83.33333333%}.col-lg-offset-9{margin-left:75%}.col-lg-offset-8{margin-left:66.66666667%}.col-lg-offset-7{margin-left:58.33333333%}.col-lg-offset-6{margin-left:50%}.col-lg-offset-5{margin-left:41.66666667%}.col-lg-offset-4{margin-left:33.33333333%}.col-lg-offset-3{margin-left:25%}.col-lg-offset-2{margin-left:16.66666667%}.col-lg-offset-1{margin-left:8.33333333%}.col-lg-offset-0{margin-left:0%}}table{background-color:transparent}caption{padding-top:8px;padding-bottom:8px;color:#999999;text-align:left}th{}.table{width:100%;max-width:100%;margin-bottom:21px}.table>thead>tr>th,.table>tbody>tr>th,.table>tfoot>tr>th,.table>thead>tr>td,.table>tbody>tr>td,.table>tfoot>tr>td{padding:8px;line-height:1.42857143;vertical-align:top;border-top:1px solid #dddddd}.table>thead>tr>th{vertical-align:bottom;border-bottom:2px solid #dddddd}.table>caption+thead>tr:first-child>th,.table>colgroup+thead>tr:first-child>th,.table>thead:first-child>tr:first-child>th,.table>caption+thead>tr:first-child>td,.table>colgroup+thead>tr:first-child>td,.table>thead:first-child>tr:first-child>td{border-top:0}.table>tbody+tbody{border-top:2px solid #dddddd}.table .table{background-color:#ffffff}.table-condensed>thead>tr>th,.table-condensed>tbody>tr>th,.table-condensed>tfoot>tr>th,.table-condensed>thead>tr>td,.table-condensed>tbody>tr>td,.table-condensed>tfoot>tr>td{padding:5px}.table-bordered{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>tbody>tr>th,.table-bordered>tfoot>tr>th,.table-bordered>thead>tr>td,.table-bordered>tbody>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>thead>tr>td{border-bottom-width:2px}.table-striped>tbody>tr:nth-child(odd){background-color:#f9f9f9}.table-hover>tbody>tr:hover{background-color:#f5f5f5}table col[class*="col-"]{position:static;float:none;display:table-column}table td[class*="col-"],table th[class*="col-"]{position:static;float:none;display:table-cell}.table>thead>tr>td.active,.table>tbody>tr>td.active,.table>tfoot>tr>td.active,.table>thead>tr>th.active,.table>tbody>tr>th.active,.table>tfoot>tr>th.active,.table>thead>tr.active>td,.table>tbody>tr.active>td,.table>tfoot>tr.active>td,.table>thead>tr.active>th,.table>tbody>tr.active>th,.table>tfoot>tr.active>th{background-color:#f5f5f5}.table-hover>tbody>tr>td.active:hover,.table-hover>tbody>tr>th.active:hover,.table-hover>tbody>tr.active:hover>td,.table-hover>tbody>tr:hover>.active,.table-hover>tbody>tr.active:hover>th{background-color:#e8e8e8}.table>thead>tr>td.success,.table>tbody>tr>td.success,.table>tfoot>tr>td.success,.table>thead>tr>th.success,.table>tbody>tr>th.success,.table>tfoot>tr>th.success,.table>thead>tr.success>td,.table>tbody>tr.success>td,.table>tfoot>tr.success>td,.table>thead>tr.success>th,.table>tbody>tr.success>th,.table>tfoot>tr.success>th{background-color:#3fb618}.table-hover>tbody>tr>td.success:hover,.table-hover>tbody>tr>th.success:hover,.table-hover>tbody>tr.success:hover>td,.table-hover>tbody>tr:hover>.success,.table-hover>tbody>tr.success:hover>th{background-color:#379f15}.table>thead>tr>td.info,.table>tbody>tr>td.info,.table>tfoot>tr>td.info,.table>thead>tr>th.info,.table>tbody>tr>th.info,.table>tfoot>tr>th.info,.table>thead>tr.info>td,.table>tbody>tr.info>td,.table>tfoot>tr.info>td,.table>thead>tr.info>th,.table>tbody>tr.info>th,.table>tfoot>tr.info>th{background-color:#9954bb}.table-hover>tbody>tr>td.info:hover,.table-hover>tbody>tr>th.info:hover,.table-hover>tbody>tr.info:hover>td,.table-hover>tbody>tr:hover>.info,.table-hover>tbody>tr.info:hover>th{background-color:#8d46b0}.table>thead>tr>td.warning,.table>tbody>tr>td.warning,.table>tfoot>tr>td.warning,.table>thead>tr>th.warning,.table>tbody>tr>th.warning,.table>tfoot>tr>th.warning,.table>thead>tr.warning>td,.table>tbody>tr.warning>td,.table>tfoot>tr.warning>td,.table>thead>tr.warning>th,.table>tbody>tr.warning>th,.table>tfoot>tr.warning>th{background-color:#ff7518}.table-hover>tbody>tr>td.warning:hover,.table-hover>tbody>tr>th.warning:hover,.table-hover>tbody>tr.warning:hover>td,.table-hover>tbody>tr:hover>.warning,.table-hover>tbody>tr.warning:hover>th{background-color:#fe6600}.table>thead>tr>td.danger,.table>tbody>tr>td.danger,.table>tfoot>tr>td.danger,.table>thead>tr>th.danger,.table>tbody>tr>th.danger,.table>tfoot>tr>th.danger,.table>thead>tr.danger>td,.table>tbody>tr.danger>td,.table>tfoot>tr.danger>td,.table>thead>tr.danger>th,.table>tbody>tr.danger>th,.table>tfoot>tr.danger>th{background-color:#ff0039}.table-hover>tbody>tr>td.danger:hover,.table-hover>tbody>tr>th.danger:hover,.table-hover>tbody>tr.danger:hover>td,.table-hover>tbody>tr:hover>.danger,.table-hover>tbody>tr.danger:hover>th{background-color:#e60033}.table-responsive{overflow-x:auto;min-height:0.01%}@media screen and (max-width:767px){.table-responsive{width:100%;margin-bottom:15.75px;overflow-y:hidden;-ms-overflow-style:-ms-autohiding-scrollbar;border:1px solid #dddddd}.table-responsive>.table{margin-bottom:0}.table-responsive>.table>thead>tr>th,.table-responsive>.table>tbody>tr>th,.table-responsive>.table>tfoot>tr>th,.table-responsive>.table>thead>tr>td,.table-responsive>.table>tbody>tr>td,.table-responsive>.table>tfoot>tr>td{white-space:nowrap}.table-responsive>.table-bordered{border:0}.table-responsive>.table-bordered>thead>tr>th:first-child,.table-responsive>.table-bordered>tbody>tr>th:first-child,.table-responsive>.table-bordered>tfoot>tr>th:first-child,.table-responsive>.table-bordered>thead>tr>td:first-child,.table-responsive>.table-bordered>tbody>tr>td:first-child,.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.table-responsive>.table-bordered>thead>tr>th:last-child,.table-responsive>.table-bordered>tbody>tr>th:last-child,.table-responsive>.table-bordered>tfoot>tr>th:last-child,.table-responsive>.table-bordered>thead>tr>td:last-child,.table-responsive>.table-bordered>tbody>tr>td:last-child,.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.table-responsive>.table-bordered>tbody>tr:last-child>th,.table-responsive>.table-bordered>tfoot>tr:last-child>th,.table-responsive>.table-bordered>tbody>tr:last-child>td,.table-responsive>.table-bordered>tfoot>tr:last-child>td{border-bottom:0}}fieldset{padding:0;margin:0;border:0;min-width:0}legend{display:block;width:100%;padding:0;margin-bottom:21px;font-size:22.5px;line-height:inherit;color:#333333;border:0;border-bottom:1px solid #e5e5e5}label{display:inline-block;max-width:100%;margin-bottom:5px;font-weight:bold}input[type="search"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}input[type="radio"],input[type="checkbox"]{margin:4px 0 0;margin-top:1px \9;line-height:normal}input[type="file"]{display:block}input[type="range"]{display:block;width:100%}select[multiple],select[size]{height:auto}input[type="file"]:focus,input[type="radio"]:focus,input[type="checkbox"]:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}output{display:block;padding-top:11px;font-size:15px;line-height:1.42857143;color:#333333}.form-control{display:block;width:100%;height:43px;padding:10px 18px;font-size:15px;line-height:1.42857143;color:#333333;background-color:#ffffff;background-image:none;border:1px solid #cccccc;border-radius:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);-webkit-transition:border-color ease-in-out .15s,-webkit-box-shadow ease-in-out .15s;-o-transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s;transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s}.form-control:focus{border-color:#66afe9;outline:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6)}.form-control::-moz-placeholder{color:#999999;opacity:1}.form-control:-ms-input-placeholder{color:#999999}.form-control::-webkit-input-placeholder{color:#999999}.form-control[disabled],.form-control[readonly],fieldset[disabled] .form-control{cursor:not-allowed;background-color:#e6e6e6;opacity:1}textarea.form-control{height:auto}input[type="search"]{-webkit-appearance:none}@media screen and (-webkit-min-device-pixel-ratio:0){input[type="date"],input[type="time"],input[type="datetime-local"],input[type="month"]{line-height:43px}input[type="date"].input-sm,input[type="time"].input-sm,input[type="datetime-local"].input-sm,input[type="month"].input-sm{line-height:31px}input[type="date"].input-lg,input[type="time"].input-lg,input[type="datetime-local"].input-lg,input[type="month"].input-lg{line-height:64px}}.form-group{margin-bottom:15px}.radio,.checkbox{position:relative;display:block;margin-top:10px;margin-bottom:10px}.radio label,.checkbox label{min-height:21px;padding-left:20px;margin-bottom:0;font-weight:normal;cursor:pointer}.radio input[type="radio"],.radio-inline input[type="radio"],.checkbox input[type="checkbox"],.checkbox-inline input[type="checkbox"]{position:absolute;margin-left:-20px;margin-top:4px \9}.radio+.radio,.checkbox+.checkbox{margin-top:-5px}.radio-inline,.checkbox-inline{display:inline-block;padding-left:20px;margin-bottom:0;vertical-align:middle;font-weight:normal;cursor:pointer}.radio-inline+.radio-inline,.checkbox-inline+.checkbox-inline{margin-top:0;margin-left:10px}input[type="radio"][disabled],input[type="checkbox"][disabled],input[type="radio"].disabled,input[type="checkbox"].disabled,fieldset[disabled] input[type="radio"],fieldset[disabled] input[type="checkbox"]{cursor:not-allowed}.radio-inline.disabled,.checkbox-inline.disabled,fieldset[disabled] .radio-inline,fieldset[disabled] .checkbox-inline{cursor:not-allowed}.radio.disabled label,.checkbox.disabled label,fieldset[disabled] .radio label,fieldset[disabled] .checkbox label{cursor:not-allowed}.form-control-static{padding-top:11px;padding-bottom:11px;margin-bottom:0}.form-control-static.input-lg,.form-control-static.input-sm{padding-left:0;padding-right:0}.input-sm,.form-group-sm .form-control{height:31px;padding:5px 10px;font-size:13px;line-height:1.5;border-radius:0}select.input-sm,select.form-group-sm .form-control{height:31px;line-height:31px}textarea.input-sm,textarea.form-group-sm .form-control,select[multiple].input-sm,select[multiple].form-group-sm .form-control{height:auto}.input-lg,.form-group-lg .form-control{height:64px;padding:18px 30px;font-size:19px;line-height:1.33;border-radius:0}select.input-lg,select.form-group-lg .form-control{height:64px;line-height:64px}textarea.input-lg,textarea.form-group-lg .form-control,select[multiple].input-lg,select[multiple].form-group-lg .form-control{height:auto}.has-feedback{position:relative}.has-feedback .form-control{padding-right:53.75px}.form-control-feedback{position:absolute;top:0;right:0;z-index:2;display:block;width:43px;height:43px;line-height:43px;text-align:center;pointer-events:none}.input-lg+.form-control-feedback{width:64px;height:64px;line-height:64px}.input-sm+.form-control-feedback{width:31px;height:31px;line-height:31px}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success.radio label,.has-success.checkbox label,.has-success.radio-inline label,.has-success.checkbox-inline label{color:#ffffff}.has-success .form-control{border-color:#ffffff;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-success .form-control:focus{border-color:#e6e6e6;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff}.has-success .input-group-addon{color:#ffffff;border-color:#ffffff;background-color:#3fb618}.has-success .form-control-feedback{color:#ffffff}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning.radio label,.has-warning.checkbox label,.has-warning.radio-inline label,.has-warning.checkbox-inline label{color:#ffffff}.has-warning .form-control{border-color:#ffffff;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-warning .form-control:focus{border-color:#e6e6e6;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff}.has-warning .input-group-addon{color:#ffffff;border-color:#ffffff;background-color:#ff7518}.has-warning .form-control-feedback{color:#ffffff}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error.radio label,.has-error.checkbox label,.has-error.radio-inline label,.has-error.checkbox-inline label{color:#ffffff}.has-error .form-control{border-color:#ffffff;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-error .form-control:focus{border-color:#e6e6e6;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff}.has-error .input-group-addon{color:#ffffff;border-color:#ffffff;background-color:#ff0039}.has-error .form-control-feedback{color:#ffffff}.has-feedback label~.form-control-feedback{top:26px}.has-feedback label.sr-only~.form-control-feedback{top:0}.help-block{display:block;margin-top:5px;margin-bottom:10px;color:#737373}@media (min-width:768px){.form-inline .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.form-inline .form-control{display:inline-block;width:auto;vertical-align:middle}.form-inline .form-control-static{display:inline-block}.form-inline .input-group{display:inline-table;vertical-align:middle}.form-inline .input-group .input-group-addon,.form-inline .input-group .input-group-btn,.form-inline .input-group .form-control{width:auto}.form-inline .input-group>.form-control{width:100%}.form-inline .control-label{margin-bottom:0;vertical-align:middle}.form-inline .radio,.form-inline .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.form-inline .radio label,.form-inline .checkbox label{padding-left:0}.form-inline .radio input[type="radio"],.form-inline .checkbox input[type="checkbox"]{position:relative;margin-left:0}.form-inline .has-feedback .form-control-feedback{top:0}}.form-horizontal .radio,.form-horizontal .checkbox,.form-horizontal .radio-inline,.form-horizontal .checkbox-inline{margin-top:0;margin-bottom:0;padding-top:11px}.form-horizontal .radio,.form-horizontal .checkbox{min-height:32px}.form-horizontal .form-group{margin-left:-15px;margin-right:-15px}@media (min-width:768px){.form-horizontal .control-label{text-align:right;margin-bottom:0;padding-top:11px}}.form-horizontal .has-feedback .form-control-feedback{right:15px}@media (min-width:768px){.form-horizontal .form-group-lg .control-label{padding-top:24.94px}}@media (min-width:768px){.form-horizontal .form-group-sm .control-label{padding-top:6px}}.btn{display:inline-block;margin-bottom:0;font-weight:normal;text-align:center;vertical-align:middle;-ms-touch-action:manipulation;touch-action:manipulation;cursor:pointer;background-image:none;border:1px solid transparent;white-space:nowrap;padding:10px 18px;font-size:15px;line-height:1.42857143;border-radius:0;-webkit-user-select:none;-moz-user-select:none;-ms-user-select:none;user-select:none}.btn:focus,.btn:active:focus,.btn.active:focus,.btn.focus,.btn:active.focus,.btn.active.focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}.btn:hover,.btn:focus,.btn.focus{color:#ffffff;text-decoration:none}.btn:active,.btn.active{outline:0;background-image:none;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn.disabled,.btn[disabled],fieldset[disabled] .btn{cursor:not-allowed;pointer-events:none;opacity:0.65;filter:alpha(opacity=65);-webkit-box-shadow:none;box-shadow:none}.btn-default{color:#ffffff;background-color:#222222;border-color:#222222}.btn-default:hover,.btn-default:focus,.btn-default.focus,.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{color:#ffffff;background-color:#090909;border-color:#040404}.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{background-image:none}.btn-default.disabled,.btn-default[disabled],fieldset[disabled] .btn-default,.btn-default.disabled:hover,.btn-default[disabled]:hover,fieldset[disabled] .btn-default:hover,.btn-default.disabled:focus,.btn-default[disabled]:focus,fieldset[disabled] .btn-default:focus,.btn-default.disabled.focus,.btn-default[disabled].focus,fieldset[disabled] .btn-default.focus,.btn-default.disabled:active,.btn-default[disabled]:active,fieldset[disabled] .btn-default:active,.btn-default.disabled.active,.btn-default[disabled].active,fieldset[disabled] .btn-default.active{background-color:#222222;border-color:#222222}.btn-default .badge{color:#222222;background-color:#ffffff}.btn-primary{color:#ffffff;background-color:#2780e3;border-color:#2780e3}.btn-primary:hover,.btn-primary:focus,.btn-primary.focus,.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{color:#ffffff;background-color:#1967be;border-color:#1862b5}.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{background-image:none}.btn-primary.disabled,.btn-primary[disabled],fieldset[disabled] .btn-primary,.btn-primary.disabled:hover,.btn-primary[disabled]:hover,fieldset[disabled] .btn-primary:hover,.btn-primary.disabled:focus,.btn-primary[disabled]:focus,fieldset[disabled] .btn-primary:focus,.btn-primary.disabled.focus,.btn-primary[disabled].focus,fieldset[disabled] .btn-primary.focus,.btn-primary.disabled:active,.btn-primary[disabled]:active,fieldset[disabled] .btn-primary:active,.btn-primary.disabled.active,.btn-primary[disabled].active,fieldset[disabled] .btn-primary.active{background-color:#2780e3;border-color:#2780e3}.btn-primary .badge{color:#2780e3;background-color:#ffffff}.btn-success{color:#ffffff;background-color:#3fb618;border-color:#3fb618}.btn-success:hover,.btn-success:focus,.btn-success.focus,.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{color:#ffffff;background-color:#2f8912;border-color:#2c8011}.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{background-image:none}.btn-success.disabled,.btn-success[disabled],fieldset[disabled] .btn-success,.btn-success.disabled:hover,.btn-success[disabled]:hover,fieldset[disabled] .btn-success:hover,.btn-success.disabled:focus,.btn-success[disabled]:focus,fieldset[disabled] .btn-success:focus,.btn-success.disabled.focus,.btn-success[disabled].focus,fieldset[disabled] .btn-success.focus,.btn-success.disabled:active,.btn-success[disabled]:active,fieldset[disabled] .btn-success:active,.btn-success.disabled.active,.btn-success[disabled].active,fieldset[disabled] .btn-success.active{background-color:#3fb618;border-color:#3fb618}.btn-success .badge{color:#3fb618;background-color:#ffffff}.btn-info{color:#ffffff;background-color:#9954bb;border-color:#9954bb}.btn-info:hover,.btn-info:focus,.btn-info.focus,.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{color:#ffffff;background-color:#7e3f9d;border-color:#783c96}.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{background-image:none}.btn-info.disabled,.btn-info[disabled],fieldset[disabled] .btn-info,.btn-info.disabled:hover,.btn-info[disabled]:hover,fieldset[disabled] .btn-info:hover,.btn-info.disabled:focus,.btn-info[disabled]:focus,fieldset[disabled] .btn-info:focus,.btn-info.disabled.focus,.btn-info[disabled].focus,fieldset[disabled] .btn-info.focus,.btn-info.disabled:active,.btn-info[disabled]:active,fieldset[disabled] .btn-info:active,.btn-info.disabled.active,.btn-info[disabled].active,fieldset[disabled] .btn-info.active{background-color:#9954bb;border-color:#9954bb}.btn-info .badge{color:#9954bb;background-color:#ffffff}.btn-warning{color:#ffffff;background-color:#ff7518;border-color:#ff7518}.btn-warning:hover,.btn-warning:focus,.btn-warning.focus,.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{color:#ffffff;background-color:#e45c00;border-color:#da5800}.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{background-image:none}.btn-warning.disabled,.btn-warning[disabled],fieldset[disabled] .btn-warning,.btn-warning.disabled:hover,.btn-warning[disabled]:hover,fieldset[disabled] .btn-warning:hover,.btn-warning.disabled:focus,.btn-warning[disabled]:focus,fieldset[disabled] .btn-warning:focus,.btn-warning.disabled.focus,.btn-warning[disabled].focus,fieldset[disabled] .btn-warning.focus,.btn-warning.disabled:active,.btn-warning[disabled]:active,fieldset[disabled] .btn-warning:active,.btn-warning.disabled.active,.btn-warning[disabled].active,fieldset[disabled] .btn-warning.active{background-color:#ff7518;border-color:#ff7518}.btn-warning .badge{color:#ff7518;background-color:#ffffff}.btn-danger{color:#ffffff;background-color:#ff0039;border-color:#ff0039}.btn-danger:hover,.btn-danger:focus,.btn-danger.focus,.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{color:#ffffff;background-color:#cc002e;border-color:#c2002b}.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{background-image:none}.btn-danger.disabled,.btn-danger[disabled],fieldset[disabled] .btn-danger,.btn-danger.disabled:hover,.btn-danger[disabled]:hover,fieldset[disabled] .btn-danger:hover,.btn-danger.disabled:focus,.btn-danger[disabled]:focus,fieldset[disabled] .btn-danger:focus,.btn-danger.disabled.focus,.btn-danger[disabled].focus,fieldset[disabled] .btn-danger.focus,.btn-danger.disabled:active,.btn-danger[disabled]:active,fieldset[disabled] .btn-danger:active,.btn-danger.disabled.active,.btn-danger[disabled].active,fieldset[disabled] .btn-danger.active{background-color:#ff0039;border-color:#ff0039}.btn-danger .badge{color:#ff0039;background-color:#ffffff}.btn-link{color:#2780e3;font-weight:normal;border-radius:0}.btn-link,.btn-link:active,.btn-link.active,.btn-link[disabled],fieldset[disabled] .btn-link{background-color:transparent;-webkit-box-shadow:none;box-shadow:none}.btn-link,.btn-link:hover,.btn-link:focus,.btn-link:active{border-color:transparent}.btn-link:hover,.btn-link:focus{color:#165ba8;text-decoration:underline;background-color:transparent}.btn-link[disabled]:hover,fieldset[disabled] .btn-link:hover,.btn-link[disabled]:focus,fieldset[disabled] .btn-link:focus{color:#999999;text-decoration:none}.btn-lg,.btn-group-lg>.btn{padding:18px 30px;font-size:19px;line-height:1.33;border-radius:0}.btn-sm,.btn-group-sm>.btn{padding:5px 10px;font-size:13px;line-height:1.5;border-radius:0}.btn-xs,.btn-group-xs>.btn{padding:1px 5px;font-size:13px;line-height:1.5;border-radius:0}.btn-block{display:block;width:100%}.btn-block+.btn-block{margin-top:5px}input[type="submit"].btn-block,input[type="reset"].btn-block,input[type="button"].btn-block{width:100%}.fade{opacity:0;-webkit-transition:opacity 0.15s linear;-o-transition:opacity 0.15s linear;transition:opacity 0.15s linear}.fade.in{opacity:1}.collapse{display:none;visibility:hidden}.collapse.in{display:block;visibility:visible}tr.collapse.in{display:table-row}tbody.collapse.in{display:table-row-group}.collapsing{position:relative;height:0;overflow:hidden;-webkit-transition-property:height, visibility;-o-transition-property:height, visibility;transition-property:height, visibility;-webkit-transition-duration:0.35s;-o-transition-duration:0.35s;transition-duration:0.35s;-webkit-transition-timing-function:ease;-o-transition-timing-function:ease;transition-timing-function:ease}.caret{display:inline-block;width:0;height:0;margin-left:2px;vertical-align:middle;border-top:4px solid;border-right:4px solid transparent;border-left:4px solid transparent}.dropdown{position:relative}.dropdown-toggle:focus{outline:0}.dropdown-menu{position:absolute;top:100%;left:0;z-index:1000;display:none;float:left;min-width:160px;padding:5px 0;margin:2px 0 0;list-style:none;font-size:15px;text-align:left;background-color:#ffffff;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.15);border-radius:0;-webkit-box-shadow:0 6px 12px rgba(0,0,0,0.175);box-shadow:0 6px 12px rgba(0,0,0,0.175);-webkit-background-clip:padding-box;background-clip:padding-box}.dropdown-menu.pull-right{right:0;left:auto}.dropdown-menu .divider{height:1px;margin:9.5px 0;overflow:hidden;background-color:#e5e5e5}.dropdown-menu>li>a{display:block;padding:3px 20px;clear:both;font-weight:normal;line-height:1.42857143;color:#333333;white-space:nowrap}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{text-decoration:none;color:#ffffff;background-color:#2780e3}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{color:#ffffff;text-decoration:none;outline:0;background-color:#2780e3}.dropdown-menu>.disabled>a,.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{color:#999999}.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{text-decoration:none;background-color:transparent;background-image:none;filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);cursor:not-allowed}.open>.dropdown-menu{display:block}.open>a{outline:0}.dropdown-menu-right{left:auto;right:0}.dropdown-menu-left{left:0;right:auto}.dropdown-header{display:block;padding:3px 20px;font-size:13px;line-height:1.42857143;color:#999999;white-space:nowrap}.dropdown-backdrop{position:fixed;left:0;right:0;bottom:0;top:0;z-index:990}.pull-right>.dropdown-menu{right:0;left:auto}.dropup .caret,.navbar-fixed-bottom .dropdown .caret{border-top:0;border-bottom:4px solid;content:""}.dropup .dropdown-menu,.navbar-fixed-bottom .dropdown .dropdown-menu{top:auto;bottom:100%;margin-bottom:1px}@media (min-width:768px){.navbar-right .dropdown-menu{left:auto;right:0}.navbar-right .dropdown-menu-left{left:0;right:auto}}.btn-group,.btn-group-vertical{position:relative;display:inline-block;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;float:left}.btn-group>.btn:hover,.btn-group-vertical>.btn:hover,.btn-group>.btn:focus,.btn-group-vertical>.btn:focus,.btn-group>.btn:active,.btn-group-vertical>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn.active{z-index:2}.btn-group .btn+.btn,.btn-group .btn+.btn-group,.btn-group .btn-group+.btn,.btn-group .btn-group+.btn-group{margin-left:-1px}.btn-toolbar{margin-left:-5px}.btn-toolbar .btn-group,.btn-toolbar .input-group{float:left}.btn-toolbar>.btn,.btn-toolbar>.btn-group,.btn-toolbar>.input-group{margin-left:5px}.btn-group>.btn:not(:first-child):not(:last-child):not(.dropdown-toggle){border-radius:0}.btn-group>.btn:first-child{margin-left:0}.btn-group>.btn:first-child:not(:last-child):not(.dropdown-toggle){border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn:last-child:not(:first-child),.btn-group>.dropdown-toggle:not(:first-child){border-bottom-left-radius:0;border-top-left-radius:0}.btn-group>.btn-group{float:left}.btn-group>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group>.btn-group:first-child>.btn:last-child,.btn-group>.btn-group:first-child>.dropdown-toggle{border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn-group:last-child>.btn:first-child{border-bottom-left-radius:0;border-top-left-radius:0}.btn-group .dropdown-toggle:active,.btn-group.open .dropdown-toggle{outline:0}.btn-group>.btn+.dropdown-toggle{padding-left:8px;padding-right:8px}.btn-group>.btn-lg+.dropdown-toggle{padding-left:12px;padding-right:12px}.btn-group.open .dropdown-toggle{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn-group.open .dropdown-toggle.btn-link{-webkit-box-shadow:none;box-shadow:none}.btn .caret{margin-left:0}.btn-lg .caret{border-width:5px 5px 0;border-bottom-width:0}.dropup .btn-lg .caret{border-width:0 5px 5px}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group,.btn-group-vertical>.btn-group>.btn{display:block;float:none;width:100%;max-width:100%}.btn-group-vertical>.btn-group>.btn{float:none}.btn-group-vertical>.btn+.btn,.btn-group-vertical>.btn+.btn-group,.btn-group-vertical>.btn-group+.btn,.btn-group-vertical>.btn-group+.btn-group{margin-top:-1px;margin-left:0}.btn-group-vertical>.btn:not(:first-child):not(:last-child){border-radius:0}.btn-group-vertical>.btn:first-child:not(:last-child){border-top-right-radius:0;border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn:last-child:not(:first-child){border-bottom-left-radius:0;border-top-right-radius:0;border-top-left-radius:0}.btn-group-vertical>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group-vertical>.btn-group:first-child:not(:last-child)>.btn:last-child,.btn-group-vertical>.btn-group:first-child:not(:last-child)>.dropdown-toggle{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn-group:last-child:not(:first-child)>.btn:first-child{border-top-right-radius:0;border-top-left-radius:0}.btn-group-justified{display:table;width:100%;table-layout:fixed;border-collapse:separate}.btn-group-justified>.btn,.btn-group-justified>.btn-group{float:none;display:table-cell;width:1%}.btn-group-justified>.btn-group .btn{width:100%}.btn-group-justified>.btn-group .dropdown-menu{left:auto}[data-toggle="buttons"]>.btn input[type="radio"],[data-toggle="buttons"]>.btn-group>.btn input[type="radio"],[data-toggle="buttons"]>.btn input[type="checkbox"],[data-toggle="buttons"]>.btn-group>.btn input[type="checkbox"]{position:absolute;clip:rect(0, 0, 0, 0);pointer-events:none}.input-group{position:relative;display:table;border-collapse:separate}.input-group[class*="col-"]{float:none;padding-left:0;padding-right:0}.input-group .form-control{position:relative;z-index:2;float:left;width:100%;margin-bottom:0}.input-group-lg>.form-control,.input-group-lg>.input-group-addon,.input-group-lg>.input-group-btn>.btn{height:64px;padding:18px 30px;font-size:19px;line-height:1.33;border-radius:0}select.input-group-lg>.form-control,select.input-group-lg>.input-group-addon,select.input-group-lg>.input-group-btn>.btn{height:64px;line-height:64px}textarea.input-group-lg>.form-control,textarea.input-group-lg>.input-group-addon,textarea.input-group-lg>.input-group-btn>.btn,select[multiple].input-group-lg>.form-control,select[multiple].input-group-lg>.input-group-addon,select[multiple].input-group-lg>.input-group-btn>.btn{height:auto}.input-group-sm>.form-control,.input-group-sm>.input-group-addon,.input-group-sm>.input-group-btn>.btn{height:31px;padding:5px 10px;font-size:13px;line-height:1.5;border-radius:0}select.input-group-sm>.form-control,select.input-group-sm>.input-group-addon,select.input-group-sm>.input-group-btn>.btn{height:31px;line-height:31px}textarea.input-group-sm>.form-control,textarea.input-group-sm>.input-group-addon,textarea.input-group-sm>.input-group-btn>.btn,select[multiple].input-group-sm>.form-control,select[multiple].input-group-sm>.input-group-addon,select[multiple].input-group-sm>.input-group-btn>.btn{height:auto}.input-group-addon,.input-group-btn,.input-group .form-control{display:table-cell}.input-group-addon:not(:first-child):not(:last-child),.input-group-btn:not(:first-child):not(:last-child),.input-group .form-control:not(:first-child):not(:last-child){border-radius:0}.input-group-addon,.input-group-btn{width:1%;white-space:nowrap;vertical-align:middle}.input-group-addon{padding:10px 18px;font-size:15px;font-weight:normal;line-height:1;color:#333333;text-align:center;background-color:#e6e6e6;border:1px solid #cccccc;border-radius:0}.input-group-addon.input-sm{padding:5px 10px;font-size:13px;border-radius:0}.input-group-addon.input-lg{padding:18px 30px;font-size:19px;border-radius:0}.input-group-addon input[type="radio"],.input-group-addon input[type="checkbox"]{margin-top:0}.input-group .form-control:first-child,.input-group-addon:first-child,.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group>.btn,.input-group-btn:first-child>.dropdown-toggle,.input-group-btn:last-child>.btn:not(:last-child):not(.dropdown-toggle),.input-group-btn:last-child>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-top-right-radius:0}.input-group-addon:first-child{border-right:0}.input-group .form-control:last-child,.input-group-addon:last-child,.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group>.btn,.input-group-btn:last-child>.dropdown-toggle,.input-group-btn:first-child>.btn:not(:first-child),.input-group-btn:first-child>.btn-group:not(:first-child)>.btn{border-bottom-left-radius:0;border-top-left-radius:0}.input-group-addon:last-child{border-left:0}.input-group-btn{position:relative;font-size:0;white-space:nowrap}.input-group-btn>.btn{position:relative}.input-group-btn>.btn+.btn{margin-left:-1px}.input-group-btn>.btn:hover,.input-group-btn>.btn:focus,.input-group-btn>.btn:active{z-index:2}.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group{margin-right:-1px}.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group{margin-left:-1px}.nav{margin-bottom:0;padding-left:0;list-style:none}.nav>li{position:relative;display:block}.nav>li>a{position:relative;display:block;padding:10px 15px}.nav>li>a:hover,.nav>li>a:focus{text-decoration:none;background-color:#e6e6e6}.nav>li.disabled>a{color:#999999}.nav>li.disabled>a:hover,.nav>li.disabled>a:focus{color:#999999;text-decoration:none;background-color:transparent;cursor:not-allowed}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{background-color:#e6e6e6;border-color:#2780e3}.nav .nav-divider{height:1px;margin:9.5px 0;overflow:hidden;background-color:#e5e5e5}.nav>li>a>img{max-width:none}.nav-tabs{border-bottom:1px solid #dddddd}.nav-tabs>li{float:left;margin-bottom:-1px}.nav-tabs>li>a{margin-right:2px;line-height:1.42857143;border:1px solid transparent;border-radius:0 0 0 0}.nav-tabs>li>a:hover{border-color:#e6e6e6 #e6e6e6 #dddddd}.nav-tabs>li.active>a,.nav-tabs>li.active>a:hover,.nav-tabs>li.active>a:focus{color:#555555;background-color:#ffffff;border:1px solid #dddddd;border-bottom-color:transparent;cursor:default}.nav-tabs.nav-justified{width:100%;border-bottom:0}.nav-tabs.nav-justified>li{float:none}.nav-tabs.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-tabs.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-tabs.nav-justified>li{display:table-cell;width:1%}.nav-tabs.nav-justified>li>a{margin-bottom:0}}.nav-tabs.nav-justified>li>a{margin-right:0;border-radius:0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs.nav-justified>li>a{border-bottom:1px solid #dddddd;border-radius:0 0 0 0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border-bottom-color:#ffffff}}.nav-pills>li{float:left}.nav-pills>li>a{border-radius:0}.nav-pills>li+li{margin-left:2px}.nav-pills>li.active>a,.nav-pills>li.active>a:hover,.nav-pills>li.active>a:focus{color:#ffffff;background-color:#2780e3}.nav-stacked>li{float:none}.nav-stacked>li+li{margin-top:2px;margin-left:0}.nav-justified{width:100%}.nav-justified>li{float:none}.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-justified>li{display:table-cell;width:1%}.nav-justified>li>a{margin-bottom:0}}.nav-tabs-justified{border-bottom:0}.nav-tabs-justified>li>a{margin-right:0;border-radius:0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs-justified>li>a{border-bottom:1px solid #dddddd;border-radius:0 0 0 0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border-bottom-color:#ffffff}}.tab-content>.tab-pane{display:none;visibility:hidden}.tab-content>.active{display:block;visibility:visible}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-right-radius:0;border-top-left-radius:0}.navbar{position:relative;min-height:50px;margin-bottom:21px;border:1px solid transparent}@media (min-width:768px){.navbar{border-radius:0}}@media (min-width:768px){.navbar-header{float:left}}.navbar-collapse{overflow-x:visible;padding-right:15px;padding-left:15px;border-top:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);-webkit-overflow-scrolling:touch}.navbar-collapse.in{overflow-y:auto}@media (min-width:768px){.navbar-collapse{width:auto;border-top:0;-webkit-box-shadow:none;box-shadow:none}.navbar-collapse.collapse{display:block !important;visibility:visible !important;height:auto !important;padding-bottom:0;overflow:visible !important}.navbar-collapse.in{overflow-y:visible}.navbar-fixed-top .navbar-collapse,.navbar-static-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{padding-left:0;padding-right:0}}.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:340px}@media (max-device-width:480px) and (orientation:landscape){.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:200px}}.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:0;margin-left:0}}.navbar-static-top{z-index:1000;border-width:0 0 1px}@media (min-width:768px){.navbar-static-top{border-radius:0}}.navbar-fixed-top,.navbar-fixed-bottom{position:fixed;right:0;left:0;z-index:1030}@media (min-width:768px){.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}}.navbar-fixed-top{top:0;border-width:0 0 1px}.navbar-fixed-bottom{bottom:0;margin-bottom:0;border-width:1px 0 0}.navbar-brand{float:left;padding:14.5px 15px;font-size:19px;line-height:21px;height:50px}.navbar-brand:hover,.navbar-brand:focus{text-decoration:none}.navbar-brand>img{display:block}@media (min-width:768px){.navbar>.container .navbar-brand,.navbar>.container-fluid .navbar-brand{margin-left:-15px}}.navbar-toggle{position:relative;float:right;margin-right:15px;padding:9px 10px;margin-top:8px;margin-bottom:8px;background-color:transparent;background-image:none;border:1px solid transparent;border-radius:0}.navbar-toggle:focus{outline:0}.navbar-toggle .icon-bar{display:block;width:22px;height:2px;border-radius:1px}.navbar-toggle .icon-bar+.icon-bar{margin-top:4px}@media (min-width:768px){.navbar-toggle{display:none}}.navbar-nav{margin:7.25px -15px}.navbar-nav>li>a{padding-top:10px;padding-bottom:10px;line-height:21px}@media (max-width:767px){.navbar-nav .open .dropdown-menu{position:static;float:none;width:auto;margin-top:0;background-color:transparent;border:0;-webkit-box-shadow:none;box-shadow:none}.navbar-nav .open .dropdown-menu>li>a,.navbar-nav .open .dropdown-menu .dropdown-header{padding:5px 15px 5px 25px}.navbar-nav .open .dropdown-menu>li>a{line-height:21px}.navbar-nav .open .dropdown-menu>li>a:hover,.navbar-nav .open .dropdown-menu>li>a:focus{background-image:none}}@media (min-width:768px){.navbar-nav{float:left;margin:0}.navbar-nav>li{float:left}.navbar-nav>li>a{padding-top:14.5px;padding-bottom:14.5px}}.navbar-form{margin-left:-15px;margin-right:-15px;padding:10px 15px;border-top:1px solid transparent;border-bottom:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);margin-top:3.5px;margin-bottom:3.5px}@media (min-width:768px){.navbar-form .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.navbar-form .form-control{display:inline-block;width:auto;vertical-align:middle}.navbar-form .form-control-static{display:inline-block}.navbar-form .input-group{display:inline-table;vertical-align:middle}.navbar-form .input-group .input-group-addon,.navbar-form .input-group .input-group-btn,.navbar-form .input-group .form-control{width:auto}.navbar-form .input-group>.form-control{width:100%}.navbar-form .control-label{margin-bottom:0;vertical-align:middle}.navbar-form .radio,.navbar-form .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.navbar-form .radio label,.navbar-form .checkbox label{padding-left:0}.navbar-form .radio input[type="radio"],.navbar-form .checkbox input[type="checkbox"]{position:relative;margin-left:0}.navbar-form .has-feedback .form-control-feedback{top:0}}@media (max-width:767px){.navbar-form .form-group{margin-bottom:5px}.navbar-form .form-group:last-child{margin-bottom:0}}@media (min-width:768px){.navbar-form{width:auto;border:0;margin-left:0;margin-right:0;padding-top:0;padding-bottom:0;-webkit-box-shadow:none;box-shadow:none}}.navbar-nav>li>.dropdown-menu{margin-top:0;border-top-right-radius:0;border-top-left-radius:0}.navbar-fixed-bottom .navbar-nav>li>.dropdown-menu{border-top-right-radius:0;border-top-left-radius:0;border-bottom-right-radius:0;border-bottom-left-radius:0}.navbar-btn{margin-top:3.5px;margin-bottom:3.5px}.navbar-btn.btn-sm{margin-top:9.5px;margin-bottom:9.5px}.navbar-btn.btn-xs{margin-top:14px;margin-bottom:14px}.navbar-text{margin-top:14.5px;margin-bottom:14.5px}@media (min-width:768px){.navbar-text{float:left;margin-left:15px;margin-right:15px}}@media (min-width:768px){.navbar-left{float:left !important}.navbar-right{float:right !important;margin-right:-15px}.navbar-right~.navbar-right{margin-right:0}}.navbar-default{background-color:#222222;border-color:#121212}.navbar-default .navbar-brand{color:#ffffff}.navbar-default .navbar-brand:hover,.navbar-default .navbar-brand:focus{color:#ffffff;background-color:none}.navbar-default .navbar-text{color:#ffffff}.navbar-default .navbar-nav>li>a{color:#ffffff}.navbar-default .navbar-nav>li>a:hover,.navbar-default .navbar-nav>li>a:focus{color:#ffffff;background-color:#090909}.navbar-default .navbar-nav>.active>a,.navbar-default .navbar-nav>.active>a:hover,.navbar-default .navbar-nav>.active>a:focus{color:#ffffff;background-color:#090909}.navbar-default .navbar-nav>.disabled>a,.navbar-default .navbar-nav>.disabled>a:hover,.navbar-default .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-default .navbar-toggle{border-color:transparent}.navbar-default .navbar-toggle:hover,.navbar-default .navbar-toggle:focus{background-color:#090909}.navbar-default .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-default .navbar-collapse,.navbar-default .navbar-form{border-color:#121212}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.open>a:hover,.navbar-default .navbar-nav>.open>a:focus{background-color:#090909;color:#ffffff}@media (max-width:767px){.navbar-default .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-default .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>li>a:focus{color:#ffffff;background-color:#090909}.navbar-default .navbar-nav .open .dropdown-menu>.active>a,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#090909}.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-default .navbar-link{color:#ffffff}.navbar-default .navbar-link:hover{color:#ffffff}.navbar-default .btn-link{color:#ffffff}.navbar-default .btn-link:hover,.navbar-default .btn-link:focus{color:#ffffff}.navbar-default .btn-link[disabled]:hover,fieldset[disabled] .navbar-default .btn-link:hover,.navbar-default .btn-link[disabled]:focus,fieldset[disabled] .navbar-default .btn-link:focus{color:#cccccc}.navbar-inverse{background-color:#2780e3;border-color:#1967be}.navbar-inverse .navbar-brand{color:#ffffff}.navbar-inverse .navbar-brand:hover,.navbar-inverse .navbar-brand:focus{color:#ffffff;background-color:none}.navbar-inverse .navbar-text{color:#ffffff}.navbar-inverse .navbar-nav>li>a{color:#ffffff}.navbar-inverse .navbar-nav>li>a:hover,.navbar-inverse .navbar-nav>li>a:focus{color:#ffffff;background-color:#1967be}.navbar-inverse .navbar-nav>.active>a,.navbar-inverse .navbar-nav>.active>a:hover,.navbar-inverse .navbar-nav>.active>a:focus{color:#ffffff;background-color:#1967be}.navbar-inverse .navbar-nav>.disabled>a,.navbar-inverse .navbar-nav>.disabled>a:hover,.navbar-inverse .navbar-nav>.disabled>a:focus{color:#ffffff;background-color:transparent}.navbar-inverse .navbar-toggle{border-color:transparent}.navbar-inverse .navbar-toggle:hover,.navbar-inverse .navbar-toggle:focus{background-color:#1967be}.navbar-inverse .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-inverse .navbar-collapse,.navbar-inverse .navbar-form{border-color:#1a6ecc}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.open>a:hover,.navbar-inverse .navbar-nav>.open>a:focus{background-color:#1967be;color:#ffffff}@media (max-width:767px){.navbar-inverse .navbar-nav .open .dropdown-menu>.dropdown-header{border-color:#1967be}.navbar-inverse .navbar-nav .open .dropdown-menu .divider{background-color:#1967be}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:focus{color:#ffffff;background-color:#1967be}.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#1967be}.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#ffffff;background-color:transparent}}.navbar-inverse .navbar-link{color:#ffffff}.navbar-inverse .navbar-link:hover{color:#ffffff}.navbar-inverse .btn-link{color:#ffffff}.navbar-inverse .btn-link:hover,.navbar-inverse .btn-link:focus{color:#ffffff}.navbar-inverse .btn-link[disabled]:hover,fieldset[disabled] .navbar-inverse .btn-link:hover,.navbar-inverse .btn-link[disabled]:focus,fieldset[disabled] .navbar-inverse .btn-link:focus{color:#ffffff}.breadcrumb{padding:8px 15px;margin-bottom:21px;list-style:none;background-color:#f5f5f5;border-radius:0}.breadcrumb>li{display:inline-block}.breadcrumb>li+li:before{content:"/\00a0";padding:0 5px;color:#cccccc}.breadcrumb>.active{color:#999999}.pagination{display:inline-block;padding-left:0;margin:21px 0;border-radius:0}.pagination>li{display:inline}.pagination>li>a,.pagination>li>span{position:relative;float:left;padding:10px 18px;line-height:1.42857143;text-decoration:none;color:#2780e3;background-color:#ffffff;border:1px solid #dddddd;margin-left:-1px}.pagination>li:first-child>a,.pagination>li:first-child>span{margin-left:0;border-bottom-left-radius:0;border-top-left-radius:0}.pagination>li:last-child>a,.pagination>li:last-child>span{border-bottom-right-radius:0;border-top-right-radius:0}.pagination>li>a:hover,.pagination>li>span:hover,.pagination>li>a:focus,.pagination>li>span:focus{color:#165ba8;background-color:#e6e6e6;border-color:#dddddd}.pagination>.active>a,.pagination>.active>span,.pagination>.active>a:hover,.pagination>.active>span:hover,.pagination>.active>a:focus,.pagination>.active>span:focus{z-index:2;color:#999999;background-color:#f5f5f5;border-color:#dddddd;cursor:default}.pagination>.disabled>span,.pagination>.disabled>span:hover,.pagination>.disabled>span:focus,.pagination>.disabled>a,.pagination>.disabled>a:hover,.pagination>.disabled>a:focus{color:#999999;background-color:#ffffff;border-color:#dddddd;cursor:not-allowed}.pagination-lg>li>a,.pagination-lg>li>span{padding:18px 30px;font-size:19px}.pagination-lg>li:first-child>a,.pagination-lg>li:first-child>span{border-bottom-left-radius:0;border-top-left-radius:0}.pagination-lg>li:last-child>a,.pagination-lg>li:last-child>span{border-bottom-right-radius:0;border-top-right-radius:0}.pagination-sm>li>a,.pagination-sm>li>span{padding:5px 10px;font-size:13px}.pagination-sm>li:first-child>a,.pagination-sm>li:first-child>span{border-bottom-left-radius:0;border-top-left-radius:0}.pagination-sm>li:last-child>a,.pagination-sm>li:last-child>span{border-bottom-right-radius:0;border-top-right-radius:0}.pager{padding-left:0;margin:21px 0;list-style:none;text-align:center}.pager li{display:inline}.pager li>a,.pager li>span{display:inline-block;padding:5px 14px;background-color:#ffffff;border:1px solid #dddddd;border-radius:0}.pager li>a:hover,.pager li>a:focus{text-decoration:none;background-color:#e6e6e6}.pager .next>a,.pager .next>span{float:right}.pager .previous>a,.pager .previous>span{float:left}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{color:#999999;background-color:#ffffff;cursor:not-allowed}.label{display:inline;padding:.2em .6em .3em;font-size:75%;font-weight:bold;line-height:1;color:#ffffff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25em}a.label:hover,a.label:focus{color:#ffffff;text-decoration:none;cursor:pointer}.label:empty{display:none}.btn .label{position:relative;top:-1px}.label-default{background-color:#222222}.label-default[href]:hover,.label-default[href]:focus{background-color:#090909}.label-primary{background-color:#2780e3}.label-primary[href]:hover,.label-primary[href]:focus{background-color:#1967be}.label-success{background-color:#3fb618}.label-success[href]:hover,.label-success[href]:focus{background-color:#2f8912}.label-info{background-color:#9954bb}.label-info[href]:hover,.label-info[href]:focus{background-color:#7e3f9d}.label-warning{background-color:#ff7518}.label-warning[href]:hover,.label-warning[href]:focus{background-color:#e45c00}.label-danger{background-color:#ff0039}.label-danger[href]:hover,.label-danger[href]:focus{background-color:#cc002e}.badge{display:inline-block;min-width:10px;padding:3px 7px;font-size:13px;font-weight:bold;color:#ffffff;line-height:1;vertical-align:baseline;white-space:nowrap;text-align:center;background-color:#2780e3;border-radius:10px}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.btn-xs .badge{top:0;padding:1px 5px}a.badge:hover,a.badge:focus{color:#ffffff;text-decoration:none;cursor:pointer}.list-group-item.active>.badge,.nav-pills>.active>a>.badge{color:#2780e3;background-color:#ffffff}.list-group-item>.badge{float:right}.list-group-item>.badge+.badge{margin-right:5px}.nav-pills>li>a>.badge{margin-left:3px}.jumbotron{padding:30px 15px;margin-bottom:30px;color:inherit;background-color:#e6e6e6}.jumbotron h1,.jumbotron .h1{color:inherit}.jumbotron p{margin-bottom:15px;font-size:23px;font-weight:200}.jumbotron>hr{border-top-color:#cccccc}.container .jumbotron,.container-fluid .jumbotron{border-radius:0}.jumbotron .container{max-width:100%}@media screen and (min-width:768px){.jumbotron{padding:48px 0}.container .jumbotron,.container-fluid .jumbotron{padding-left:60px;padding-right:60px}.jumbotron h1,.jumbotron .h1{font-size:67.5px}}.thumbnail{display:block;padding:4px;margin-bottom:21px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:0;-webkit-transition:border .2s ease-in-out;-o-transition:border .2s ease-in-out;transition:border .2s ease-in-out}.thumbnail>img,.thumbnail a>img{margin-left:auto;margin-right:auto}a.thumbnail:hover,a.thumbnail:focus,a.thumbnail.active{border-color:#2780e3}.thumbnail .caption{padding:9px;color:#333333}.alert{padding:15px;margin-bottom:21px;border:1px solid transparent;border-radius:0}.alert h4{margin-top:0;color:inherit}.alert .alert-link{font-weight:bold}.alert>p,.alert>ul{margin-bottom:0}.alert>p+p{margin-top:5px}.alert-dismissable,.alert-dismissible{padding-right:35px}.alert-dismissable .close,.alert-dismissible .close{position:relative;top:-2px;right:-21px;color:inherit}.alert-success{background-color:#3fb618;border-color:#4e9f15;color:#ffffff}.alert-success hr{border-top-color:#438912}.alert-success .alert-link{color:#e6e6e6}.alert-info{background-color:#9954bb;border-color:#7643a8;color:#ffffff}.alert-info hr{border-top-color:#693c96}.alert-info .alert-link{color:#e6e6e6}.alert-warning{background-color:#ff7518;border-color:#ff4309;color:#ffffff}.alert-warning hr{border-top-color:#ee3800}.alert-warning .alert-link{color:#e6e6e6}.alert-danger{background-color:#ff0039;border-color:#f0005e;color:#ffffff}.alert-danger hr{border-top-color:#d60054}.alert-danger .alert-link{color:#e6e6e6}@-webkit-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@-o-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}.progress{overflow:hidden;height:21px;margin-bottom:21px;background-color:#cccccc;border-radius:0;-webkit-box-shadow:inset 0 1px 2px rgba(0,0,0,0.1);box-shadow:inset 0 1px 2px rgba(0,0,0,0.1)}.progress-bar{float:left;width:0%;height:100%;font-size:13px;line-height:21px;color:#ffffff;text-align:center;background-color:#2780e3;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);-webkit-transition:width 0.6s ease;-o-transition:width 0.6s ease;transition:width 0.6s ease}.progress-striped .progress-bar,.progress-bar-striped{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);-webkit-background-size:40px 40px;background-size:40px 40px}.progress.active .progress-bar,.progress-bar.active{-webkit-animation:progress-bar-stripes 2s linear infinite;-o-animation:progress-bar-stripes 2s linear infinite;animation:progress-bar-stripes 2s linear infinite}.progress-bar-success{background-color:#3fb618}.progress-striped .progress-bar-success{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-info{background-color:#9954bb}.progress-striped .progress-bar-info{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-warning{background-color:#ff7518}.progress-striped .progress-bar-warning{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-danger{background-color:#ff0039}.progress-striped .progress-bar-danger{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.media{margin-top:15px}.media:first-child{margin-top:0}.media-right,.media>.pull-right{padding-left:10px}.media-left,.media>.pull-left{padding-right:10px}.media-left,.media-right,.media-body{display:table-cell;vertical-align:top}.media-middle{vertical-align:middle}.media-bottom{vertical-align:bottom}.media-heading{margin-top:0;margin-bottom:5px}.media-list{padding-left:0;list-style:none}.list-group{margin-bottom:20px;padding-left:0}.list-group-item{position:relative;display:block;padding:10px 15px;margin-bottom:-1px;background-color:#ffffff;border:1px solid #dddddd}.list-group-item:first-child{border-top-right-radius:0;border-top-left-radius:0}.list-group-item:last-child{margin-bottom:0;border-bottom-right-radius:0;border-bottom-left-radius:0}a.list-group-item{color:#555555}a.list-group-item .list-group-item-heading{color:#333333}a.list-group-item:hover,a.list-group-item:focus{text-decoration:none;color:#555555;background-color:#f5f5f5}.list-group-item.disabled,.list-group-item.disabled:hover,.list-group-item.disabled:focus{background-color:#e6e6e6;color:#999999;cursor:not-allowed}.list-group-item.disabled .list-group-item-heading,.list-group-item.disabled:hover .list-group-item-heading,.list-group-item.disabled:focus .list-group-item-heading{color:inherit}.list-group-item.disabled .list-group-item-text,.list-group-item.disabled:hover .list-group-item-text,.list-group-item.disabled:focus .list-group-item-text{color:#999999}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{z-index:2;color:#ffffff;background-color:#2780e3;border-color:#dddddd}.list-group-item.active .list-group-item-heading,.list-group-item.active:hover .list-group-item-heading,.list-group-item.active:focus .list-group-item-heading,.list-group-item.active .list-group-item-heading>small,.list-group-item.active:hover .list-group-item-heading>small,.list-group-item.active:focus .list-group-item-heading>small,.list-group-item.active .list-group-item-heading>.small,.list-group-item.active:hover .list-group-item-heading>.small,.list-group-item.active:focus .list-group-item-heading>.small{color:inherit}.list-group-item.active .list-group-item-text,.list-group-item.active:hover .list-group-item-text,.list-group-item.active:focus .list-group-item-text{color:#dceafa}.list-group-item-success{color:#ffffff;background-color:#3fb618}a.list-group-item-success{color:#ffffff}a.list-group-item-success .list-group-item-heading{color:inherit}a.list-group-item-success:hover,a.list-group-item-success:focus{color:#ffffff;background-color:#379f15}a.list-group-item-success.active,a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{color:#fff;background-color:#ffffff;border-color:#ffffff}.list-group-item-info{color:#ffffff;background-color:#9954bb}a.list-group-item-info{color:#ffffff}a.list-group-item-info .list-group-item-heading{color:inherit}a.list-group-item-info:hover,a.list-group-item-info:focus{color:#ffffff;background-color:#8d46b0}a.list-group-item-info.active,a.list-group-item-info.active:hover,a.list-group-item-info.active:focus{color:#fff;background-color:#ffffff;border-color:#ffffff}.list-group-item-warning{color:#ffffff;background-color:#ff7518}a.list-group-item-warning{color:#ffffff}a.list-group-item-warning .list-group-item-heading{color:inherit}a.list-group-item-warning:hover,a.list-group-item-warning:focus{color:#ffffff;background-color:#fe6600}a.list-group-item-warning.active,a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{color:#fff;background-color:#ffffff;border-color:#ffffff}.list-group-item-danger{color:#ffffff;background-color:#ff0039}a.list-group-item-danger{color:#ffffff}a.list-group-item-danger .list-group-item-heading{color:inherit}a.list-group-item-danger:hover,a.list-group-item-danger:focus{color:#ffffff;background-color:#e60033}a.list-group-item-danger.active,a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{color:#fff;background-color:#ffffff;border-color:#ffffff}.list-group-item-heading{margin-top:0;margin-bottom:5px}.list-group-item-text{margin-bottom:0;line-height:1.3}.panel{margin-bottom:21px;background-color:#ffffff;border:1px solid transparent;border-radius:0;-webkit-box-shadow:0 1px 1px rgba(0,0,0,0.05);box-shadow:0 1px 1px rgba(0,0,0,0.05)}.panel-body{padding:15px}.panel-heading{padding:10px 15px;border-bottom:1px solid transparent;border-top-right-radius:-1;border-top-left-radius:-1}.panel-heading>.dropdown .dropdown-toggle{color:inherit}.panel-title{margin-top:0;margin-bottom:0;font-size:17px;color:inherit}.panel-title>a{color:inherit}.panel-footer{padding:10px 15px;background-color:#f5f5f5;border-top:1px solid #dddddd;border-bottom-right-radius:-1;border-bottom-left-radius:-1}.panel>.list-group,.panel>.panel-collapse>.list-group{margin-bottom:0}.panel>.list-group .list-group-item,.panel>.panel-collapse>.list-group .list-group-item{border-width:1px 0;border-radius:0}.panel>.list-group:first-child .list-group-item:first-child,.panel>.panel-collapse>.list-group:first-child .list-group-item:first-child{border-top:0;border-top-right-radius:-1;border-top-left-radius:-1}.panel>.list-group:last-child .list-group-item:last-child,.panel>.panel-collapse>.list-group:last-child .list-group-item:last-child{border-bottom:0;border-bottom-right-radius:-1;border-bottom-left-radius:-1}.panel-heading+.list-group .list-group-item:first-child{border-top-width:0}.list-group+.panel-footer{border-top-width:0}.panel>.table,.panel>.table-responsive>.table,.panel>.panel-collapse>.table{margin-bottom:0}.panel>.table caption,.panel>.table-responsive>.table caption,.panel>.panel-collapse>.table caption{padding-left:15px;padding-right:15px}.panel>.table:first-child,.panel>.table-responsive:first-child>.table:first-child{border-top-right-radius:-1;border-top-left-radius:-1}.panel>.table:first-child>thead:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child{border-top-left-radius:-1;border-top-right-radius:-1}.panel>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:first-child{border-top-left-radius:-1}.panel>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:last-child{border-top-right-radius:-1}.panel>.table:last-child,.panel>.table-responsive:last-child>.table:last-child{border-bottom-right-radius:-1;border-bottom-left-radius:-1}.panel>.table:last-child>tbody:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child{border-bottom-left-radius:-1;border-bottom-right-radius:-1}.panel>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:first-child{border-bottom-left-radius:-1}.panel>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:last-child{border-bottom-right-radius:-1}.panel>.panel-body+.table,.panel>.panel-body+.table-responsive,.panel>.table+.panel-body,.panel>.table-responsive+.panel-body{border-top:1px solid #dddddd}.panel>.table>tbody:first-child>tr:first-child th,.panel>.table>tbody:first-child>tr:first-child td{border-top:0}.panel>.table-bordered,.panel>.table-responsive>.table-bordered{border:0}.panel>.table-bordered>thead>tr>th:first-child,.panel>.table-responsive>.table-bordered>thead>tr>th:first-child,.panel>.table-bordered>tbody>tr>th:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:first-child,.panel>.table-bordered>tfoot>tr>th:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:first-child,.panel>.table-bordered>thead>tr>td:first-child,.panel>.table-responsive>.table-bordered>thead>tr>td:first-child,.panel>.table-bordered>tbody>tr>td:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:first-child,.panel>.table-bordered>tfoot>tr>td:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.panel>.table-bordered>thead>tr>th:last-child,.panel>.table-responsive>.table-bordered>thead>tr>th:last-child,.panel>.table-bordered>tbody>tr>th:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:last-child,.panel>.table-bordered>tfoot>tr>th:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:last-child,.panel>.table-bordered>thead>tr>td:last-child,.panel>.table-responsive>.table-bordered>thead>tr>td:last-child,.panel>.table-bordered>tbody>tr>td:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:last-child,.panel>.table-bordered>tfoot>tr>td:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.panel>.table-bordered>thead>tr:first-child>td,.panel>.table-responsive>.table-bordered>thead>tr:first-child>td,.panel>.table-bordered>tbody>tr:first-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>td,.panel>.table-bordered>thead>tr:first-child>th,.panel>.table-responsive>.table-bordered>thead>tr:first-child>th,.panel>.table-bordered>tbody>tr:first-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>th{border-bottom:0}.panel>.table-bordered>tbody>tr:last-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>td,.panel>.table-bordered>tfoot>tr:last-child>td,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>td,.panel>.table-bordered>tbody>tr:last-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>th,.panel>.table-bordered>tfoot>tr:last-child>th,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>th{border-bottom:0}.panel>.table-responsive{border:0;margin-bottom:0}.panel-group{margin-bottom:21px}.panel-group .panel{margin-bottom:0;border-radius:0}.panel-group .panel+.panel{margin-top:5px}.panel-group .panel-heading{border-bottom:0}.panel-group .panel-heading+.panel-collapse>.panel-body,.panel-group .panel-heading+.panel-collapse>.list-group{border-top:1px solid #dddddd}.panel-group .panel-footer{border-top:0}.panel-group .panel-footer+.panel-collapse .panel-body{border-bottom:1px solid #dddddd}.panel-default{border-color:#dddddd}.panel-default>.panel-heading{color:#333333;background-color:#f5f5f5;border-color:#dddddd}.panel-default>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-default>.panel-heading .badge{color:#f5f5f5;background-color:#333333}.panel-default>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-primary{border-color:#2780e3}.panel-primary>.panel-heading{color:#ffffff;background-color:#2780e3;border-color:#2780e3}.panel-primary>.panel-heading+.panel-collapse>.panel-body{border-top-color:#2780e3}.panel-primary>.panel-heading .badge{color:#2780e3;background-color:#ffffff}.panel-primary>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#2780e3}.panel-success{border-color:#4e9f15}.panel-success>.panel-heading{color:#ffffff;background-color:#3fb618;border-color:#4e9f15}.panel-success>.panel-heading+.panel-collapse>.panel-body{border-top-color:#4e9f15}.panel-success>.panel-heading .badge{color:#3fb618;background-color:#ffffff}.panel-success>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#4e9f15}.panel-info{border-color:#7643a8}.panel-info>.panel-heading{color:#ffffff;background-color:#9954bb;border-color:#7643a8}.panel-info>.panel-heading+.panel-collapse>.panel-body{border-top-color:#7643a8}.panel-info>.panel-heading .badge{color:#9954bb;background-color:#ffffff}.panel-info>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#7643a8}.panel-warning{border-color:#ff4309}.panel-warning>.panel-heading{color:#ffffff;background-color:#ff7518;border-color:#ff4309}.panel-warning>.panel-heading+.panel-collapse>.panel-body{border-top-color:#ff4309}.panel-warning>.panel-heading .badge{color:#ff7518;background-color:#ffffff}.panel-warning>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#ff4309}.panel-danger{border-color:#f0005e}.panel-danger>.panel-heading{color:#ffffff;background-color:#ff0039;border-color:#f0005e}.panel-danger>.panel-heading+.panel-collapse>.panel-body{border-top-color:#f0005e}.panel-danger>.panel-heading .badge{color:#ff0039;background-color:#ffffff}.panel-danger>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#f0005e}.embed-responsive{position:relative;display:block;height:0;padding:0;overflow:hidden}.embed-responsive .embed-responsive-item,.embed-responsive iframe,.embed-responsive embed,.embed-responsive object,.embed-responsive video{position:absolute;top:0;left:0;bottom:0;height:100%;width:100%;border:0}.embed-responsive.embed-responsive-16by9{padding-bottom:56.25%}.embed-responsive.embed-responsive-4by3{padding-bottom:75%}.well{min-height:20px;padding:19px;margin-bottom:20px;background-color:#f5f5f5;border:1px solid #e3e3e3;border-radius:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.05);box-shadow:inset 0 1px 1px rgba(0,0,0,0.05)}.well blockquote{border-color:#ddd;border-color:rgba(0,0,0,0.15)}.well-lg{padding:24px;border-radius:0}.well-sm{padding:9px;border-radius:0}.close{float:right;font-size:22.5px;font-weight:bold;line-height:1;color:#ffffff;text-shadow:0 1px 0 #ffffff;opacity:0.2;filter:alpha(opacity=20)}.close:hover,.close:focus{color:#ffffff;text-decoration:none;cursor:pointer;opacity:0.5;filter:alpha(opacity=50)}button.close{padding:0;cursor:pointer;background:transparent;border:0;-webkit-appearance:none}.modal-open{overflow:hidden}.modal{display:none;overflow:hidden;position:fixed;top:0;right:0;bottom:0;left:0;z-index:1040;-webkit-overflow-scrolling:touch;outline:0}.modal.fade .modal-dialog{-webkit-transform:translate(0, -25%);-ms-transform:translate(0, -25%);-o-transform:translate(0, -25%);transform:translate(0, -25%);-webkit-transition:-webkit-transform .3s ease-out;-o-transition:-o-transform .3s ease-out;transition:transform .3s ease-out}.modal.in .modal-dialog{-webkit-transform:translate(0, 0);-ms-transform:translate(0, 0);-o-transform:translate(0, 0);transform:translate(0, 0)}.modal-open .modal{overflow-x:hidden;overflow-y:auto}.modal-dialog{position:relative;width:auto;margin:10px}.modal-content{position:relative;background-color:#ffffff;border:1px solid #999999;border:1px solid transparent;border-radius:0;-webkit-box-shadow:0 3px 9px rgba(0,0,0,0.5);box-shadow:0 3px 9px rgba(0,0,0,0.5);-webkit-background-clip:padding-box;background-clip:padding-box;outline:0}.modal-backdrop{position:absolute;top:0;right:0;left:0;background-color:#000000}.modal-backdrop.fade{opacity:0;filter:alpha(opacity=0)}.modal-backdrop.in{opacity:0.5;filter:alpha(opacity=50)}.modal-header{padding:15px;border-bottom:1px solid #e5e5e5;min-height:16.42857143px}.modal-header .close{margin-top:-2px}.modal-title{margin:0;line-height:1.42857143}.modal-body{position:relative;padding:20px}.modal-footer{padding:20px;text-align:right;border-top:1px solid #e5e5e5}.modal-footer .btn+.btn{margin-left:5px;margin-bottom:0}.modal-footer .btn-group .btn+.btn{margin-left:-1px}.modal-footer .btn-block+.btn-block{margin-left:0}.modal-scrollbar-measure{position:absolute;top:-9999px;width:50px;height:50px;overflow:scroll}@media (min-width:768px){.modal-dialog{width:600px;margin:30px auto}.modal-content{-webkit-box-shadow:0 5px 15px rgba(0,0,0,0.5);box-shadow:0 5px 15px rgba(0,0,0,0.5)}.modal-sm{width:300px}}@media (min-width:992px){.modal-lg{width:900px}}.tooltip{position:absolute;z-index:1070;display:block;visibility:visible;font-family:"Source Sans Pro",Calibri,Candara,Arial,sans-serif;font-size:13px;font-weight:normal;line-height:1.4;opacity:0;filter:alpha(opacity=0)}.tooltip.in{opacity:0.9;filter:alpha(opacity=90)}.tooltip.top{margin-top:-3px;padding:5px 0}.tooltip.right{margin-left:3px;padding:0 5px}.tooltip.bottom{margin-top:3px;padding:5px 0}.tooltip.left{margin-left:-3px;padding:0 5px}.tooltip-inner{max-width:200px;padding:3px 8px;color:#ffffff;text-align:center;text-decoration:none;background-color:rgba(0,0,0,0.9);border-radius:0}.tooltip-arrow{position:absolute;width:0;height:0;border-color:transparent;border-style:solid}.tooltip.top .tooltip-arrow{bottom:0;left:50%;margin-left:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-left .tooltip-arrow{bottom:0;right:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-right .tooltip-arrow{bottom:0;left:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.right .tooltip-arrow{top:50%;left:0;margin-top:-5px;border-width:5px 5px 5px 0;border-right-color:rgba(0,0,0,0.9)}.tooltip.left .tooltip-arrow{top:50%;right:0;margin-top:-5px;border-width:5px 0 5px 5px;border-left-color:rgba(0,0,0,0.9)}.tooltip.bottom .tooltip-arrow{top:0;left:50%;margin-left:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-left .tooltip-arrow{top:0;right:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-right .tooltip-arrow{top:0;left:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.popover{position:absolute;top:0;left:0;z-index:1060;display:none;max-width:276px;padding:1px;font-family:"Source Sans Pro",Calibri,Candara,Arial,sans-serif;font-size:15px;font-weight:normal;line-height:1.42857143;text-align:left;background-color:#ffffff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.2);border-radius:0;-webkit-box-shadow:0 5px 10px rgba(0,0,0,0.2);box-shadow:0 5px 10px rgba(0,0,0,0.2);white-space:normal}.popover.top{margin-top:-10px}.popover.right{margin-left:10px}.popover.bottom{margin-top:10px}.popover.left{margin-left:-10px}.popover-title{margin:0;padding:8px 14px;font-size:15px;background-color:#f7f7f7;border-bottom:1px solid #ebebeb;border-radius:-1 -1 0 0}.popover-content{padding:9px 14px}.popover>.arrow,.popover>.arrow:after{position:absolute;display:block;width:0;height:0;border-color:transparent;border-style:solid}.popover>.arrow{border-width:11px}.popover>.arrow:after{border-width:10px;content:""}.popover.top>.arrow{left:50%;margin-left:-11px;border-bottom-width:0;border-top-color:#999999;border-top-color:rgba(0,0,0,0.25);bottom:-11px}.popover.top>.arrow:after{content:" ";bottom:1px;margin-left:-10px;border-bottom-width:0;border-top-color:#ffffff}.popover.right>.arrow{top:50%;left:-11px;margin-top:-11px;border-left-width:0;border-right-color:#999999;border-right-color:rgba(0,0,0,0.25)}.popover.right>.arrow:after{content:" ";left:1px;bottom:-10px;border-left-width:0;border-right-color:#ffffff}.popover.bottom>.arrow{left:50%;margin-left:-11px;border-top-width:0;border-bottom-color:#999999;border-bottom-color:rgba(0,0,0,0.25);top:-11px}.popover.bottom>.arrow:after{content:" ";top:1px;margin-left:-10px;border-top-width:0;border-bottom-color:#ffffff}.popover.left>.arrow{top:50%;right:-11px;margin-top:-11px;border-right-width:0;border-left-color:#999999;border-left-color:rgba(0,0,0,0.25)}.popover.left>.arrow:after{content:" ";right:1px;border-right-width:0;border-left-color:#ffffff;bottom:-10px}.carousel{position:relative}.carousel-inner{position:relative;overflow:hidden;width:100%}.carousel-inner>.item{display:none;position:relative;-webkit-transition:.6s ease-in-out left;-o-transition:.6s ease-in-out left;transition:.6s ease-in-out left}.carousel-inner>.item>img,.carousel-inner>.item>a>img{line-height:1}@media all and (transform-3d),(-webkit-transform-3d){.carousel-inner>.item{-webkit-transition:-webkit-transform .6s ease-in-out;-o-transition:-o-transform .6s ease-in-out;transition:transform .6s ease-in-out;-webkit-backface-visibility:hidden;backface-visibility:hidden;-webkit-perspective:1000;perspective:1000}.carousel-inner>.item.next,.carousel-inner>.item.active.right{-webkit-transform:translate3d(100%, 0, 0);transform:translate3d(100%, 0, 0);left:0}.carousel-inner>.item.prev,.carousel-inner>.item.active.left{-webkit-transform:translate3d(-100%, 0, 0);transform:translate3d(-100%, 0, 0);left:0}.carousel-inner>.item.next.left,.carousel-inner>.item.prev.right,.carousel-inner>.item.active{-webkit-transform:translate3d(0, 0, 0);transform:translate3d(0, 0, 0);left:0}}.carousel-inner>.active,.carousel-inner>.next,.carousel-inner>.prev{display:block}.carousel-inner>.active{left:0}.carousel-inner>.next,.carousel-inner>.prev{position:absolute;top:0;width:100%}.carousel-inner>.next{left:100%}.carousel-inner>.prev{left:-100%}.carousel-inner>.next.left,.carousel-inner>.prev.right{left:0}.carousel-inner>.active.left{left:-100%}.carousel-inner>.active.right{left:100%}.carousel-control{position:absolute;top:0;left:0;bottom:0;width:15%;opacity:0.5;filter:alpha(opacity=50);font-size:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-control.left{background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.5)), to(rgba(0,0,0,0.0001)));background-image:linear-gradient(to right, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1)}.carousel-control.right{left:auto;right:0;background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.0001)), to(rgba(0,0,0,0.5)));background-image:linear-gradient(to right, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1)}.carousel-control:hover,.carousel-control:focus{outline:0;color:#ffffff;text-decoration:none;opacity:0.9;filter:alpha(opacity=90)}.carousel-control .icon-prev,.carousel-control .icon-next,.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right{position:absolute;top:50%;z-index:5;display:inline-block}.carousel-control .icon-prev,.carousel-control .glyphicon-chevron-left{left:50%;margin-left:-10px}.carousel-control .icon-next,.carousel-control .glyphicon-chevron-right{right:50%;margin-right:-10px}.carousel-control .icon-prev,.carousel-control .icon-next{width:20px;height:20px;margin-top:-10px;font-family:serif}.carousel-control .icon-prev:before{content:'\2039'}.carousel-control .icon-next:before{content:'\203a'}.carousel-indicators{position:absolute;bottom:10px;left:50%;z-index:15;width:60%;margin-left:-30%;padding-left:0;list-style:none;text-align:center}.carousel-indicators li{display:inline-block;width:10px;height:10px;margin:1px;text-indent:-999px;border:1px solid #ffffff;border-radius:10px;cursor:pointer;background-color:#000 \9;background-color:rgba(0,0,0,0)}.carousel-indicators .active{margin:0;width:12px;height:12px;background-color:#ffffff}.carousel-caption{position:absolute;left:15%;right:15%;bottom:20px;z-index:10;padding-top:20px;padding-bottom:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-caption .btn{text-shadow:none}@media screen and (min-width:768px){.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right,.carousel-control .icon-prev,.carousel-control .icon-next{width:30px;height:30px;margin-top:-15px;font-size:30px}.carousel-control .glyphicon-chevron-left,.carousel-control .icon-prev{margin-left:-15px}.carousel-control .glyphicon-chevron-right,.carousel-control .icon-next{margin-right:-15px}.carousel-caption{left:20%;right:20%;padding-bottom:30px}.carousel-indicators{bottom:20px}}.clearfix:before,.clearfix:after,.dl-horizontal dd:before,.dl-horizontal dd:after,.container:before,.container:after,.container-fluid:before,.container-fluid:after,.row:before,.row:after,.form-horizontal .form-group:before,.form-horizontal .form-group:after,.btn-toolbar:before,.btn-toolbar:after,.btn-group-vertical>.btn-group:before,.btn-group-vertical>.btn-group:after,.nav:before,.nav:after,.navbar:before,.navbar:after,.navbar-header:before,.navbar-header:after,.navbar-collapse:before,.navbar-collapse:after,.pager:before,.pager:after,.panel-body:before,.panel-body:after,.modal-footer:before,.modal-footer:after{content:" ";display:table}.clearfix:after,.dl-horizontal dd:after,.container:after,.container-fluid:after,.row:after,.form-horizontal .form-group:after,.btn-toolbar:after,.btn-group-vertical>.btn-group:after,.nav:after,.navbar:after,.navbar-header:after,.navbar-collapse:after,.pager:after,.panel-body:after,.modal-footer:after{clear:both}.center-block{display:block;margin-left:auto;margin-right:auto}.pull-right{float:right !important}.pull-left{float:left !important}.hide{display:none !important}.show{display:block !important}.invisible{visibility:hidden}.text-hide{font:0/0 a;color:transparent;text-shadow:none;background-color:transparent;border:0}.hidden{display:none !important;visibility:hidden !important}.affix{position:fixed}@-ms-viewport{width:device-width}.visible-xs,.visible-sm,.visible-md,.visible-lg{display:none !important}.visible-xs-block,.visible-xs-inline,.visible-xs-inline-block,.visible-sm-block,.visible-sm-inline,.visible-sm-inline-block,.visible-md-block,.visible-md-inline,.visible-md-inline-block,.visible-lg-block,.visible-lg-inline,.visible-lg-inline-block{display:none !important}@media (max-width:767px){.visible-xs{display:block !important}table.visible-xs{display:table}tr.visible-xs{display:table-row !important}th.visible-xs,td.visible-xs{display:table-cell !important}}@media (max-width:767px){.visible-xs-block{display:block !important}}@media (max-width:767px){.visible-xs-inline{display:inline !important}}@media (max-width:767px){.visible-xs-inline-block{display:inline-block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm{display:block !important}table.visible-sm{display:table}tr.visible-sm{display:table-row !important}th.visible-sm,td.visible-sm{display:table-cell !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-block{display:block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline{display:inline !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline-block{display:inline-block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md{display:block !important}table.visible-md{display:table}tr.visible-md{display:table-row !important}th.visible-md,td.visible-md{display:table-cell !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-block{display:block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline{display:inline !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline-block{display:inline-block !important}}@media (min-width:1200px){.visible-lg{display:block !important}table.visible-lg{display:table}tr.visible-lg{display:table-row !important}th.visible-lg,td.visible-lg{display:table-cell !important}}@media (min-width:1200px){.visible-lg-block{display:block !important}}@media (min-width:1200px){.visible-lg-inline{display:inline !important}}@media (min-width:1200px){.visible-lg-inline-block{display:inline-block !important}}@media (max-width:767px){.hidden-xs{display:none !important}}@media (min-width:768px) and (max-width:991px){.hidden-sm{display:none !important}}@media (min-width:992px) and (max-width:1199px){.hidden-md{display:none !important}}@media (min-width:1200px){.hidden-lg{display:none !important}}.visible-print{display:none !important}@media print{.visible-print{display:block !important}table.visible-print{display:table}tr.visible-print{display:table-row !important}th.visible-print,td.visible-print{display:table-cell !important}}.visible-print-block{display:none !important}@media print{.visible-print-block{display:block !important}}.visible-print-inline{display:none !important}@media print{.visible-print-inline{display:inline !important}}.visible-print-inline-block{display:none !important}@media print{.visible-print-inline-block{display:inline-block !important}}@media print{.hidden-print{display:none !important}}.navbar-inverse .badge{background-color:#fff;color:#2780e3}body{-webkit-font-smoothing:antialiased}.text-primary,.text-primary:hover{color:#2780e3}.text-success,.text-success:hover{color:#3fb618}.text-danger,.text-danger:hover{color:#ff0039}.text-warning,.text-warning:hover{color:#ff7518}.text-info,.text-info:hover{color:#9954bb}table a:not(.btn),.table a:not(.btn){text-decoration:underline}table .dropdown-menu a,.table .dropdown-menu a{text-decoration:none}table .success,.table .success,table .warning,.table .warning,table .danger,.table .danger,table .info,.table .info{color:#fff}table .success a,.table .success a,table .warning a,.table .warning a,table .danger a,.table .danger a,table .info a,.table .info a{color:#fff}.has-warning .help-block,.has-warning .control-label,.has-warning .form-control-feedback{color:#ff7518}.has-warning .form-control,.has-warning .form-control:focus,.has-warning .input-group-addon{border:1px solid #ff7518}.has-error .help-block,.has-error .control-label,.has-error .form-control-feedback{color:#ff0039}.has-error .form-control,.has-error .form-control:focus,.has-error .input-group-addon{border:1px solid #ff0039}.has-success .help-block,.has-success .control-label,.has-success .form-control-feedback{color:#3fb618}.has-success .form-control,.has-success .form-control:focus,.has-success .input-group-addon{border:1px solid #3fb618}.nav-pills>li>a{border-radius:0}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{background-image:none}.close{text-decoration:none;text-shadow:none;opacity:0.4}.close:hover,.close:focus{opacity:1}.alert{border:none}.alert .alert-link{text-decoration:underline;color:#fff}.label{border-radius:0}.progress{height:8px;-webkit-box-shadow:none;box-shadow:none}.progress .progress-bar{font-size:8px;line-height:8px}.panel-heading,.panel-footer{border-top-right-radius:0;border-top-left-radius:0}.panel-default .close{color:#333333}a.list-group-item-success.active{background-color:#3fb618}a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{background-color:#379f15}a.list-group-item-warning.active{background-color:#ff7518}a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{background-color:#fe6600}a.list-group-item-danger.active{background-color:#ff0039}a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{background-color:#e60033}.modal .close{color:#333333}.popover{color:#333333} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/css/flatly.min.css b/www/bootstrap-3.3.1/css/flatly.min.css deleted file mode 100644 index 9b2a8f9..0000000 --- a/www/bootstrap-3.3.1/css/flatly.min.css +++ /dev/null @@ -1,26 +0,0 @@ -@font-face { - font-family: 'Lato'; - font-style: normal; - font-weight: 400; - src: url(fonts/Lato.ttf) format('truetype'); -} -@font-face { - font-family: 'Lato'; - font-style: normal; - font-weight: 700; - src: url(fonts/LatoBold.ttf) format('truetype'); -} -@font-face { - font-family: 'Lato'; - font-style: italic; - font-weight: 400; - src: url(fonts/LatoItalic.ttf) format('truetype'); -} - -/*! - * bootswatch v3.3.1+1 - * Homepage: http://bootswatch.com - * Copyright 2012-2014 Thomas Park - * Licensed under MIT - * Based on Bootstrap -*//*! normalize.css v3.0.2 | MIT License | git.io/normalize */html{font-family:sans-serif;-ms-text-size-adjust:100%;-webkit-text-size-adjust:100%}body{margin:0}article,aside,details,figcaption,figure,footer,header,hgroup,main,menu,nav,section,summary{display:block}audio,canvas,progress,video{display:inline-block;vertical-align:baseline}audio:not([controls]){display:none;height:0}[hidden],template{display:none}a{background-color:transparent}a:active,a:hover{outline:0}abbr[title]{border-bottom:1px dotted}b,strong{font-weight:bold}dfn{font-style:italic}h1{font-size:2em;margin:0.67em 0}mark{background:#ff0;color:#000}small{font-size:80%}sub,sup{font-size:75%;line-height:0;position:relative;vertical-align:baseline}sup{top:-0.5em}sub{bottom:-0.25em}img{border:0}svg:not(:root){overflow:hidden}figure{margin:1em 40px}hr{-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box;height:0}pre{overflow:auto}code,kbd,pre,samp{font-family:monospace, monospace;font-size:1em}button,input,optgroup,select,textarea{color:inherit;font:inherit;margin:0}button{overflow:visible}button,select{text-transform:none}button,html input[type="button"],input[type="reset"],input[type="submit"]{-webkit-appearance:button;cursor:pointer}button[disabled],html input[disabled]{cursor:default}button::-moz-focus-inner,input::-moz-focus-inner{border:0;padding:0}input{line-height:normal}input[type="checkbox"],input[type="radio"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box;padding:0}input[type="number"]::-webkit-inner-spin-button,input[type="number"]::-webkit-outer-spin-button{height:auto}input[type="search"]{-webkit-appearance:textfield;-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box}input[type="search"]::-webkit-search-cancel-button,input[type="search"]::-webkit-search-decoration{-webkit-appearance:none}fieldset{border:1px solid #c0c0c0;margin:0 2px;padding:0.35em 0.625em 0.75em}legend{border:0;padding:0}textarea{overflow:auto}optgroup{font-weight:bold}table{border-collapse:collapse;border-spacing:0}td,th{padding:0}/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */@media print{*,*:before,*:after{background:transparent !important;color:#000 !important;-webkit-box-shadow:none !important;box-shadow:none !important;text-shadow:none !important}a,a:visited{text-decoration:underline}a[href]:after{content:" (" attr(href) ")"}abbr[title]:after{content:" (" attr(title) ")"}a[href^="#"]:after,a[href^="javascript:"]:after{content:""}pre,blockquote{border:1px solid #999;page-break-inside:avoid}thead{display:table-header-group}tr,img{page-break-inside:avoid}img{max-width:100% !important}p,h2,h3{orphans:3;widows:3}h2,h3{page-break-after:avoid}select{background:#fff !important}.navbar{display:none}.btn>.caret,.dropup>.btn>.caret{border-top-color:#000 !important}.label{border:1px solid #000}.table{border-collapse:collapse !important}.table td,.table th{background-color:#fff !important}.table-bordered th,.table-bordered td{border:1px solid #ddd !important}}@font-face{font-family:'Glyphicons Halflings';src:url('../fonts/glyphicons-halflings-regular.eot');src:url('../fonts/glyphicons-halflings-regular.eot?#iefix') format('embedded-opentype'),url('../fonts/glyphicons-halflings-regular.woff') format('woff'),url('../fonts/glyphicons-halflings-regular.ttf') format('truetype'),url('../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular') format('svg')}.glyphicon{position:relative;top:1px;display:inline-block;font-family:'Glyphicons Halflings';font-style:normal;font-weight:normal;line-height:1;-webkit-font-smoothing:antialiased;-moz-osx-font-smoothing:grayscale}.glyphicon-asterisk:before{content:"\2a"}.glyphicon-plus:before{content:"\2b"}.glyphicon-euro:before,.glyphicon-eur:before{content:"\20ac"}.glyphicon-minus:before{content:"\2212"}.glyphicon-cloud:before{content:"\2601"}.glyphicon-envelope:before{content:"\2709"}.glyphicon-pencil:before{content:"\270f"}.glyphicon-glass:before{content:"\e001"}.glyphicon-music:before{content:"\e002"}.glyphicon-search:before{content:"\e003"}.glyphicon-heart:before{content:"\e005"}.glyphicon-star:before{content:"\e006"}.glyphicon-star-empty:before{content:"\e007"}.glyphicon-user:before{content:"\e008"}.glyphicon-film:before{content:"\e009"}.glyphicon-th-large:before{content:"\e010"}.glyphicon-th:before{content:"\e011"}.glyphicon-th-list:before{content:"\e012"}.glyphicon-ok:before{content:"\e013"}.glyphicon-remove:before{content:"\e014"}.glyphicon-zoom-in:before{content:"\e015"}.glyphicon-zoom-out:before{content:"\e016"}.glyphicon-off:before{content:"\e017"}.glyphicon-signal:before{content:"\e018"}.glyphicon-cog:before{content:"\e019"}.glyphicon-trash:before{content:"\e020"}.glyphicon-home:before{content:"\e021"}.glyphicon-file:before{content:"\e022"}.glyphicon-time:before{content:"\e023"}.glyphicon-road:before{content:"\e024"}.glyphicon-download-alt:before{content:"\e025"}.glyphicon-download:before{content:"\e026"}.glyphicon-upload:before{content:"\e027"}.glyphicon-inbox:before{content:"\e028"}.glyphicon-play-circle:before{content:"\e029"}.glyphicon-repeat:before{content:"\e030"}.glyphicon-refresh:before{content:"\e031"}.glyphicon-list-alt:before{content:"\e032"}.glyphicon-lock:before{content:"\e033"}.glyphicon-flag:before{content:"\e034"}.glyphicon-headphones:before{content:"\e035"}.glyphicon-volume-off:before{content:"\e036"}.glyphicon-volume-down:before{content:"\e037"}.glyphicon-volume-up:before{content:"\e038"}.glyphicon-qrcode:before{content:"\e039"}.glyphicon-barcode:before{content:"\e040"}.glyphicon-tag:before{content:"\e041"}.glyphicon-tags:before{content:"\e042"}.glyphicon-book:before{content:"\e043"}.glyphicon-bookmark:before{content:"\e044"}.glyphicon-print:before{content:"\e045"}.glyphicon-camera:before{content:"\e046"}.glyphicon-font:before{content:"\e047"}.glyphicon-bold:before{content:"\e048"}.glyphicon-italic:before{content:"\e049"}.glyphicon-text-height:before{content:"\e050"}.glyphicon-text-width:before{content:"\e051"}.glyphicon-align-left:before{content:"\e052"}.glyphicon-align-center:before{content:"\e053"}.glyphicon-align-right:before{content:"\e054"}.glyphicon-align-justify:before{content:"\e055"}.glyphicon-list:before{content:"\e056"}.glyphicon-indent-left:before{content:"\e057"}.glyphicon-indent-right:before{content:"\e058"}.glyphicon-facetime-video:before{content:"\e059"}.glyphicon-picture:before{content:"\e060"}.glyphicon-map-marker:before{content:"\e062"}.glyphicon-adjust:before{content:"\e063"}.glyphicon-tint:before{content:"\e064"}.glyphicon-edit:before{content:"\e065"}.glyphicon-share:before{content:"\e066"}.glyphicon-check:before{content:"\e067"}.glyphicon-move:before{content:"\e068"}.glyphicon-step-backward:before{content:"\e069"}.glyphicon-fast-backward:before{content:"\e070"}.glyphicon-backward:before{content:"\e071"}.glyphicon-play:before{content:"\e072"}.glyphicon-pause:before{content:"\e073"}.glyphicon-stop:before{content:"\e074"}.glyphicon-forward:before{content:"\e075"}.glyphicon-fast-forward:before{content:"\e076"}.glyphicon-step-forward:before{content:"\e077"}.glyphicon-eject:before{content:"\e078"}.glyphicon-chevron-left:before{content:"\e079"}.glyphicon-chevron-right:before{content:"\e080"}.glyphicon-plus-sign:before{content:"\e081"}.glyphicon-minus-sign:before{content:"\e082"}.glyphicon-remove-sign:before{content:"\e083"}.glyphicon-ok-sign:before{content:"\e084"}.glyphicon-question-sign:before{content:"\e085"}.glyphicon-info-sign:before{content:"\e086"}.glyphicon-screenshot:before{content:"\e087"}.glyphicon-remove-circle:before{content:"\e088"}.glyphicon-ok-circle:before{content:"\e089"}.glyphicon-ban-circle:before{content:"\e090"}.glyphicon-arrow-left:before{content:"\e091"}.glyphicon-arrow-right:before{content:"\e092"}.glyphicon-arrow-up:before{content:"\e093"}.glyphicon-arrow-down:before{content:"\e094"}.glyphicon-share-alt:before{content:"\e095"}.glyphicon-resize-full:before{content:"\e096"}.glyphicon-resize-small:before{content:"\e097"}.glyphicon-exclamation-sign:before{content:"\e101"}.glyphicon-gift:before{content:"\e102"}.glyphicon-leaf:before{content:"\e103"}.glyphicon-fire:before{content:"\e104"}.glyphicon-eye-open:before{content:"\e105"}.glyphicon-eye-close:before{content:"\e106"}.glyphicon-warning-sign:before{content:"\e107"}.glyphicon-plane:before{content:"\e108"}.glyphicon-calendar:before{content:"\e109"}.glyphicon-random:before{content:"\e110"}.glyphicon-comment:before{content:"\e111"}.glyphicon-magnet:before{content:"\e112"}.glyphicon-chevron-up:before{content:"\e113"}.glyphicon-chevron-down:before{content:"\e114"}.glyphicon-retweet:before{content:"\e115"}.glyphicon-shopping-cart:before{content:"\e116"}.glyphicon-folder-close:before{content:"\e117"}.glyphicon-folder-open:before{content:"\e118"}.glyphicon-resize-vertical:before{content:"\e119"}.glyphicon-resize-horizontal:before{content:"\e120"}.glyphicon-hdd:before{content:"\e121"}.glyphicon-bullhorn:before{content:"\e122"}.glyphicon-bell:before{content:"\e123"}.glyphicon-certificate:before{content:"\e124"}.glyphicon-thumbs-up:before{content:"\e125"}.glyphicon-thumbs-down:before{content:"\e126"}.glyphicon-hand-right:before{content:"\e127"}.glyphicon-hand-left:before{content:"\e128"}.glyphicon-hand-up:before{content:"\e129"}.glyphicon-hand-down:before{content:"\e130"}.glyphicon-circle-arrow-right:before{content:"\e131"}.glyphicon-circle-arrow-left:before{content:"\e132"}.glyphicon-circle-arrow-up:before{content:"\e133"}.glyphicon-circle-arrow-down:before{content:"\e134"}.glyphicon-globe:before{content:"\e135"}.glyphicon-wrench:before{content:"\e136"}.glyphicon-tasks:before{content:"\e137"}.glyphicon-filter:before{content:"\e138"}.glyphicon-briefcase:before{content:"\e139"}.glyphicon-fullscreen:before{content:"\e140"}.glyphicon-dashboard:before{content:"\e141"}.glyphicon-paperclip:before{content:"\e142"}.glyphicon-heart-empty:before{content:"\e143"}.glyphicon-link:before{content:"\e144"}.glyphicon-phone:before{content:"\e145"}.glyphicon-pushpin:before{content:"\e146"}.glyphicon-usd:before{content:"\e148"}.glyphicon-gbp:before{content:"\e149"}.glyphicon-sort:before{content:"\e150"}.glyphicon-sort-by-alphabet:before{content:"\e151"}.glyphicon-sort-by-alphabet-alt:before{content:"\e152"}.glyphicon-sort-by-order:before{content:"\e153"}.glyphicon-sort-by-order-alt:before{content:"\e154"}.glyphicon-sort-by-attributes:before{content:"\e155"}.glyphicon-sort-by-attributes-alt:before{content:"\e156"}.glyphicon-unchecked:before{content:"\e157"}.glyphicon-expand:before{content:"\e158"}.glyphicon-collapse-down:before{content:"\e159"}.glyphicon-collapse-up:before{content:"\e160"}.glyphicon-log-in:before{content:"\e161"}.glyphicon-flash:before{content:"\e162"}.glyphicon-log-out:before{content:"\e163"}.glyphicon-new-window:before{content:"\e164"}.glyphicon-record:before{content:"\e165"}.glyphicon-save:before{content:"\e166"}.glyphicon-open:before{content:"\e167"}.glyphicon-saved:before{content:"\e168"}.glyphicon-import:before{content:"\e169"}.glyphicon-export:before{content:"\e170"}.glyphicon-send:before{content:"\e171"}.glyphicon-floppy-disk:before{content:"\e172"}.glyphicon-floppy-saved:before{content:"\e173"}.glyphicon-floppy-remove:before{content:"\e174"}.glyphicon-floppy-save:before{content:"\e175"}.glyphicon-floppy-open:before{content:"\e176"}.glyphicon-credit-card:before{content:"\e177"}.glyphicon-transfer:before{content:"\e178"}.glyphicon-cutlery:before{content:"\e179"}.glyphicon-header:before{content:"\e180"}.glyphicon-compressed:before{content:"\e181"}.glyphicon-earphone:before{content:"\e182"}.glyphicon-phone-alt:before{content:"\e183"}.glyphicon-tower:before{content:"\e184"}.glyphicon-stats:before{content:"\e185"}.glyphicon-sd-video:before{content:"\e186"}.glyphicon-hd-video:before{content:"\e187"}.glyphicon-subtitles:before{content:"\e188"}.glyphicon-sound-stereo:before{content:"\e189"}.glyphicon-sound-dolby:before{content:"\e190"}.glyphicon-sound-5-1:before{content:"\e191"}.glyphicon-sound-6-1:before{content:"\e192"}.glyphicon-sound-7-1:before{content:"\e193"}.glyphicon-copyright-mark:before{content:"\e194"}.glyphicon-registration-mark:before{content:"\e195"}.glyphicon-cloud-download:before{content:"\e197"}.glyphicon-cloud-upload:before{content:"\e198"}.glyphicon-tree-conifer:before{content:"\e199"}.glyphicon-tree-deciduous:before{content:"\e200"}*{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}*:before,*:after{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}html{font-size:10px;-webkit-tap-highlight-color:rgba(0,0,0,0)}body{font-family:"Lato","Helvetica Neue",Helvetica,Arial,sans-serif;font-size:15px;line-height:1.42857143;color:#2c3e50;background-color:#ffffff}input,button,select,textarea{font-family:inherit;font-size:inherit;line-height:inherit}a{color:#18bc9c;text-decoration:none}a:hover,a:focus{color:#18bc9c;text-decoration:underline}a:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}figure{margin:0}img{vertical-align:middle}.img-responsive,.thumbnail>img,.thumbnail a>img,.carousel-inner>.item>img,.carousel-inner>.item>a>img{display:block;max-width:100%;height:auto}.img-rounded{border-radius:6px}.img-thumbnail{padding:4px;line-height:1.42857143;background-color:#ffffff;border:1px solid #ecf0f1;border-radius:4px;-webkit-transition:all .2s ease-in-out;-o-transition:all .2s ease-in-out;transition:all .2s ease-in-out;display:inline-block;max-width:100%;height:auto}.img-circle{border-radius:50%}hr{margin-top:21px;margin-bottom:21px;border:0;border-top:1px solid #ecf0f1}.sr-only{position:absolute;width:1px;height:1px;margin:-1px;padding:0;overflow:hidden;clip:rect(0, 0, 0, 0);border:0}.sr-only-focusable:active,.sr-only-focusable:focus{position:static;width:auto;height:auto;margin:0;overflow:visible;clip:auto}h1,h2,h3,h4,h5,h6,.h1,.h2,.h3,.h4,.h5,.h6{font-family:"Lato","Helvetica Neue",Helvetica,Arial,sans-serif;font-weight:400;line-height:1.1;color:inherit}h1 small,h2 small,h3 small,h4 small,h5 small,h6 small,.h1 small,.h2 small,.h3 small,.h4 small,.h5 small,.h6 small,h1 .small,h2 .small,h3 .small,h4 .small,h5 .small,h6 .small,.h1 .small,.h2 .small,.h3 .small,.h4 .small,.h5 .small,.h6 .small{font-weight:normal;line-height:1;color:#b4bcc2}h1,.h1,h2,.h2,h3,.h3{margin-top:21px;margin-bottom:10.5px}h1 small,.h1 small,h2 small,.h2 small,h3 small,.h3 small,h1 .small,.h1 .small,h2 .small,.h2 .small,h3 .small,.h3 .small{font-size:65%}h4,.h4,h5,.h5,h6,.h6{margin-top:10.5px;margin-bottom:10.5px}h4 small,.h4 small,h5 small,.h5 small,h6 small,.h6 small,h4 .small,.h4 .small,h5 .small,.h5 .small,h6 .small,.h6 .small{font-size:75%}h1,.h1{font-size:39px}h2,.h2{font-size:32px}h3,.h3{font-size:26px}h4,.h4{font-size:19px}h5,.h5{font-size:15px}h6,.h6{font-size:13px}p{margin:0 0 10.5px}.lead{margin-bottom:21px;font-size:17px;font-weight:300;line-height:1.4}@media (min-width:768px){.lead{font-size:22.5px}}small,.small{font-size:86%}mark,.mark{background-color:#f39c12;padding:.2em}.text-left{text-align:left}.text-right{text-align:right}.text-center{text-align:center}.text-justify{text-align:justify}.text-nowrap{white-space:nowrap}.text-lowercase{text-transform:lowercase}.text-uppercase{text-transform:uppercase}.text-capitalize{text-transform:capitalize}.text-muted{color:#b4bcc2}.text-primary{color:#2c3e50}a.text-primary:hover{color:#1a242f}.text-success{color:#ffffff}a.text-success:hover{color:#e6e6e6}.text-info{color:#ffffff}a.text-info:hover{color:#e6e6e6}.text-warning{color:#ffffff}a.text-warning:hover{color:#e6e6e6}.text-danger{color:#ffffff}a.text-danger:hover{color:#e6e6e6}.bg-primary{color:#fff;background-color:#2c3e50}a.bg-primary:hover{background-color:#1a242f}.bg-success{background-color:#18bc9c}a.bg-success:hover{background-color:#128f76}.bg-info{background-color:#3498db}a.bg-info:hover{background-color:#217dbb}.bg-warning{background-color:#f39c12}a.bg-warning:hover{background-color:#c87f0a}.bg-danger{background-color:#e74c3c}a.bg-danger:hover{background-color:#d62c1a}.page-header{padding-bottom:9.5px;margin:42px 0 21px;border-bottom:1px solid transparent}ul,ol{margin-top:0;margin-bottom:10.5px}ul ul,ol ul,ul ol,ol ol{margin-bottom:0}.list-unstyled{padding-left:0;list-style:none}.list-inline{padding-left:0;list-style:none;margin-left:-5px}.list-inline>li{display:inline-block;padding-left:5px;padding-right:5px}dl{margin-top:0;margin-bottom:21px}dt,dd{line-height:1.42857143}dt{font-weight:bold}dd{margin-left:0}@media (min-width:768px){.dl-horizontal dt{float:left;width:160px;clear:left;text-align:right;overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.dl-horizontal dd{margin-left:180px}}abbr[title],abbr[data-original-title]{cursor:help;border-bottom:1px dotted #b4bcc2}.initialism{font-size:90%;text-transform:uppercase}blockquote{padding:10.5px 21px;margin:0 0 21px;font-size:18.75px;border-left:5px solid #ecf0f1}blockquote p:last-child,blockquote ul:last-child,blockquote ol:last-child{margin-bottom:0}blockquote footer,blockquote small,blockquote .small{display:block;font-size:80%;line-height:1.42857143;color:#b4bcc2}blockquote footer:before,blockquote small:before,blockquote .small:before{content:'\2014 \00A0'}.blockquote-reverse,blockquote.pull-right{padding-right:15px;padding-left:0;border-right:5px solid #ecf0f1;border-left:0;text-align:right}.blockquote-reverse footer:before,blockquote.pull-right footer:before,.blockquote-reverse small:before,blockquote.pull-right small:before,.blockquote-reverse .small:before,blockquote.pull-right .small:before{content:''}.blockquote-reverse footer:after,blockquote.pull-right footer:after,.blockquote-reverse small:after,blockquote.pull-right small:after,.blockquote-reverse .small:after,blockquote.pull-right .small:after{content:'\00A0 \2014'}address{margin-bottom:21px;font-style:normal;line-height:1.42857143}code,kbd,pre,samp{font-family:monospace}code{padding:2px 4px;font-size:90%;color:#c7254e;background-color:#f9f2f4;border-radius:4px}kbd{padding:2px 4px;font-size:90%;color:#ffffff;background-color:#333333;border-radius:3px;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25)}kbd kbd{padding:0;font-size:100%;font-weight:bold;-webkit-box-shadow:none;box-shadow:none}pre{display:block;padding:10px;margin:0 0 10.5px;font-size:14px;line-height:1.42857143;word-break:break-all;word-wrap:break-word;color:#7b8a8b;background-color:#ecf0f1;border:1px solid #cccccc;border-radius:4px}pre code{padding:0;font-size:inherit;color:inherit;white-space:pre-wrap;background-color:transparent;border-radius:0}.pre-scrollable{max-height:340px;overflow-y:scroll}.container{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}@media (min-width:768px){.container{width:750px}}@media (min-width:992px){.container{width:970px}}@media (min-width:1200px){.container{width:1170px}}.container-fluid{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}.row{margin-left:-15px;margin-right:-15px}.col-xs-1,.col-sm-1,.col-md-1,.col-lg-1,.col-xs-2,.col-sm-2,.col-md-2,.col-lg-2,.col-xs-3,.col-sm-3,.col-md-3,.col-lg-3,.col-xs-4,.col-sm-4,.col-md-4,.col-lg-4,.col-xs-5,.col-sm-5,.col-md-5,.col-lg-5,.col-xs-6,.col-sm-6,.col-md-6,.col-lg-6,.col-xs-7,.col-sm-7,.col-md-7,.col-lg-7,.col-xs-8,.col-sm-8,.col-md-8,.col-lg-8,.col-xs-9,.col-sm-9,.col-md-9,.col-lg-9,.col-xs-10,.col-sm-10,.col-md-10,.col-lg-10,.col-xs-11,.col-sm-11,.col-md-11,.col-lg-11,.col-xs-12,.col-sm-12,.col-md-12,.col-lg-12{position:relative;min-height:1px;padding-left:15px;padding-right:15px}.col-xs-1,.col-xs-2,.col-xs-3,.col-xs-4,.col-xs-5,.col-xs-6,.col-xs-7,.col-xs-8,.col-xs-9,.col-xs-10,.col-xs-11,.col-xs-12{float:left}.col-xs-12{width:100%}.col-xs-11{width:91.66666667%}.col-xs-10{width:83.33333333%}.col-xs-9{width:75%}.col-xs-8{width:66.66666667%}.col-xs-7{width:58.33333333%}.col-xs-6{width:50%}.col-xs-5{width:41.66666667%}.col-xs-4{width:33.33333333%}.col-xs-3{width:25%}.col-xs-2{width:16.66666667%}.col-xs-1{width:8.33333333%}.col-xs-pull-12{right:100%}.col-xs-pull-11{right:91.66666667%}.col-xs-pull-10{right:83.33333333%}.col-xs-pull-9{right:75%}.col-xs-pull-8{right:66.66666667%}.col-xs-pull-7{right:58.33333333%}.col-xs-pull-6{right:50%}.col-xs-pull-5{right:41.66666667%}.col-xs-pull-4{right:33.33333333%}.col-xs-pull-3{right:25%}.col-xs-pull-2{right:16.66666667%}.col-xs-pull-1{right:8.33333333%}.col-xs-pull-0{right:auto}.col-xs-push-12{left:100%}.col-xs-push-11{left:91.66666667%}.col-xs-push-10{left:83.33333333%}.col-xs-push-9{left:75%}.col-xs-push-8{left:66.66666667%}.col-xs-push-7{left:58.33333333%}.col-xs-push-6{left:50%}.col-xs-push-5{left:41.66666667%}.col-xs-push-4{left:33.33333333%}.col-xs-push-3{left:25%}.col-xs-push-2{left:16.66666667%}.col-xs-push-1{left:8.33333333%}.col-xs-push-0{left:auto}.col-xs-offset-12{margin-left:100%}.col-xs-offset-11{margin-left:91.66666667%}.col-xs-offset-10{margin-left:83.33333333%}.col-xs-offset-9{margin-left:75%}.col-xs-offset-8{margin-left:66.66666667%}.col-xs-offset-7{margin-left:58.33333333%}.col-xs-offset-6{margin-left:50%}.col-xs-offset-5{margin-left:41.66666667%}.col-xs-offset-4{margin-left:33.33333333%}.col-xs-offset-3{margin-left:25%}.col-xs-offset-2{margin-left:16.66666667%}.col-xs-offset-1{margin-left:8.33333333%}.col-xs-offset-0{margin-left:0%}@media (min-width:768px){.col-sm-1,.col-sm-2,.col-sm-3,.col-sm-4,.col-sm-5,.col-sm-6,.col-sm-7,.col-sm-8,.col-sm-9,.col-sm-10,.col-sm-11,.col-sm-12{float:left}.col-sm-12{width:100%}.col-sm-11{width:91.66666667%}.col-sm-10{width:83.33333333%}.col-sm-9{width:75%}.col-sm-8{width:66.66666667%}.col-sm-7{width:58.33333333%}.col-sm-6{width:50%}.col-sm-5{width:41.66666667%}.col-sm-4{width:33.33333333%}.col-sm-3{width:25%}.col-sm-2{width:16.66666667%}.col-sm-1{width:8.33333333%}.col-sm-pull-12{right:100%}.col-sm-pull-11{right:91.66666667%}.col-sm-pull-10{right:83.33333333%}.col-sm-pull-9{right:75%}.col-sm-pull-8{right:66.66666667%}.col-sm-pull-7{right:58.33333333%}.col-sm-pull-6{right:50%}.col-sm-pull-5{right:41.66666667%}.col-sm-pull-4{right:33.33333333%}.col-sm-pull-3{right:25%}.col-sm-pull-2{right:16.66666667%}.col-sm-pull-1{right:8.33333333%}.col-sm-pull-0{right:auto}.col-sm-push-12{left:100%}.col-sm-push-11{left:91.66666667%}.col-sm-push-10{left:83.33333333%}.col-sm-push-9{left:75%}.col-sm-push-8{left:66.66666667%}.col-sm-push-7{left:58.33333333%}.col-sm-push-6{left:50%}.col-sm-push-5{left:41.66666667%}.col-sm-push-4{left:33.33333333%}.col-sm-push-3{left:25%}.col-sm-push-2{left:16.66666667%}.col-sm-push-1{left:8.33333333%}.col-sm-push-0{left:auto}.col-sm-offset-12{margin-left:100%}.col-sm-offset-11{margin-left:91.66666667%}.col-sm-offset-10{margin-left:83.33333333%}.col-sm-offset-9{margin-left:75%}.col-sm-offset-8{margin-left:66.66666667%}.col-sm-offset-7{margin-left:58.33333333%}.col-sm-offset-6{margin-left:50%}.col-sm-offset-5{margin-left:41.66666667%}.col-sm-offset-4{margin-left:33.33333333%}.col-sm-offset-3{margin-left:25%}.col-sm-offset-2{margin-left:16.66666667%}.col-sm-offset-1{margin-left:8.33333333%}.col-sm-offset-0{margin-left:0%}}@media (min-width:992px){.col-md-1,.col-md-2,.col-md-3,.col-md-4,.col-md-5,.col-md-6,.col-md-7,.col-md-8,.col-md-9,.col-md-10,.col-md-11,.col-md-12{float:left}.col-md-12{width:100%}.col-md-11{width:91.66666667%}.col-md-10{width:83.33333333%}.col-md-9{width:75%}.col-md-8{width:66.66666667%}.col-md-7{width:58.33333333%}.col-md-6{width:50%}.col-md-5{width:41.66666667%}.col-md-4{width:33.33333333%}.col-md-3{width:25%}.col-md-2{width:16.66666667%}.col-md-1{width:8.33333333%}.col-md-pull-12{right:100%}.col-md-pull-11{right:91.66666667%}.col-md-pull-10{right:83.33333333%}.col-md-pull-9{right:75%}.col-md-pull-8{right:66.66666667%}.col-md-pull-7{right:58.33333333%}.col-md-pull-6{right:50%}.col-md-pull-5{right:41.66666667%}.col-md-pull-4{right:33.33333333%}.col-md-pull-3{right:25%}.col-md-pull-2{right:16.66666667%}.col-md-pull-1{right:8.33333333%}.col-md-pull-0{right:auto}.col-md-push-12{left:100%}.col-md-push-11{left:91.66666667%}.col-md-push-10{left:83.33333333%}.col-md-push-9{left:75%}.col-md-push-8{left:66.66666667%}.col-md-push-7{left:58.33333333%}.col-md-push-6{left:50%}.col-md-push-5{left:41.66666667%}.col-md-push-4{left:33.33333333%}.col-md-push-3{left:25%}.col-md-push-2{left:16.66666667%}.col-md-push-1{left:8.33333333%}.col-md-push-0{left:auto}.col-md-offset-12{margin-left:100%}.col-md-offset-11{margin-left:91.66666667%}.col-md-offset-10{margin-left:83.33333333%}.col-md-offset-9{margin-left:75%}.col-md-offset-8{margin-left:66.66666667%}.col-md-offset-7{margin-left:58.33333333%}.col-md-offset-6{margin-left:50%}.col-md-offset-5{margin-left:41.66666667%}.col-md-offset-4{margin-left:33.33333333%}.col-md-offset-3{margin-left:25%}.col-md-offset-2{margin-left:16.66666667%}.col-md-offset-1{margin-left:8.33333333%}.col-md-offset-0{margin-left:0%}}@media (min-width:1200px){.col-lg-1,.col-lg-2,.col-lg-3,.col-lg-4,.col-lg-5,.col-lg-6,.col-lg-7,.col-lg-8,.col-lg-9,.col-lg-10,.col-lg-11,.col-lg-12{float:left}.col-lg-12{width:100%}.col-lg-11{width:91.66666667%}.col-lg-10{width:83.33333333%}.col-lg-9{width:75%}.col-lg-8{width:66.66666667%}.col-lg-7{width:58.33333333%}.col-lg-6{width:50%}.col-lg-5{width:41.66666667%}.col-lg-4{width:33.33333333%}.col-lg-3{width:25%}.col-lg-2{width:16.66666667%}.col-lg-1{width:8.33333333%}.col-lg-pull-12{right:100%}.col-lg-pull-11{right:91.66666667%}.col-lg-pull-10{right:83.33333333%}.col-lg-pull-9{right:75%}.col-lg-pull-8{right:66.66666667%}.col-lg-pull-7{right:58.33333333%}.col-lg-pull-6{right:50%}.col-lg-pull-5{right:41.66666667%}.col-lg-pull-4{right:33.33333333%}.col-lg-pull-3{right:25%}.col-lg-pull-2{right:16.66666667%}.col-lg-pull-1{right:8.33333333%}.col-lg-pull-0{right:auto}.col-lg-push-12{left:100%}.col-lg-push-11{left:91.66666667%}.col-lg-push-10{left:83.33333333%}.col-lg-push-9{left:75%}.col-lg-push-8{left:66.66666667%}.col-lg-push-7{left:58.33333333%}.col-lg-push-6{left:50%}.col-lg-push-5{left:41.66666667%}.col-lg-push-4{left:33.33333333%}.col-lg-push-3{left:25%}.col-lg-push-2{left:16.66666667%}.col-lg-push-1{left:8.33333333%}.col-lg-push-0{left:auto}.col-lg-offset-12{margin-left:100%}.col-lg-offset-11{margin-left:91.66666667%}.col-lg-offset-10{margin-left:83.33333333%}.col-lg-offset-9{margin-left:75%}.col-lg-offset-8{margin-left:66.66666667%}.col-lg-offset-7{margin-left:58.33333333%}.col-lg-offset-6{margin-left:50%}.col-lg-offset-5{margin-left:41.66666667%}.col-lg-offset-4{margin-left:33.33333333%}.col-lg-offset-3{margin-left:25%}.col-lg-offset-2{margin-left:16.66666667%}.col-lg-offset-1{margin-left:8.33333333%}.col-lg-offset-0{margin-left:0%}}table{background-color:transparent}caption{padding-top:8px;padding-bottom:8px;color:#b4bcc2;text-align:left}th{}.table{width:100%;max-width:100%;margin-bottom:21px}.table>thead>tr>th,.table>tbody>tr>th,.table>tfoot>tr>th,.table>thead>tr>td,.table>tbody>tr>td,.table>tfoot>tr>td{padding:8px;line-height:1.42857143;vertical-align:top;border-top:1px solid #ecf0f1}.table>thead>tr>th{vertical-align:bottom;border-bottom:2px solid #ecf0f1}.table>caption+thead>tr:first-child>th,.table>colgroup+thead>tr:first-child>th,.table>thead:first-child>tr:first-child>th,.table>caption+thead>tr:first-child>td,.table>colgroup+thead>tr:first-child>td,.table>thead:first-child>tr:first-child>td{border-top:0}.table>tbody+tbody{border-top:2px solid #ecf0f1}.table .table{background-color:#ffffff}.table-condensed>thead>tr>th,.table-condensed>tbody>tr>th,.table-condensed>tfoot>tr>th,.table-condensed>thead>tr>td,.table-condensed>tbody>tr>td,.table-condensed>tfoot>tr>td{padding:5px}.table-bordered{border:1px solid #ecf0f1}.table-bordered>thead>tr>th,.table-bordered>tbody>tr>th,.table-bordered>tfoot>tr>th,.table-bordered>thead>tr>td,.table-bordered>tbody>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #ecf0f1}.table-bordered>thead>tr>th,.table-bordered>thead>tr>td{border-bottom-width:2px}.table-striped>tbody>tr:nth-child(odd){background-color:#f9f9f9}.table-hover>tbody>tr:hover{background-color:#ecf0f1}table col[class*="col-"]{position:static;float:none;display:table-column}table td[class*="col-"],table th[class*="col-"]{position:static;float:none;display:table-cell}.table>thead>tr>td.active,.table>tbody>tr>td.active,.table>tfoot>tr>td.active,.table>thead>tr>th.active,.table>tbody>tr>th.active,.table>tfoot>tr>th.active,.table>thead>tr.active>td,.table>tbody>tr.active>td,.table>tfoot>tr.active>td,.table>thead>tr.active>th,.table>tbody>tr.active>th,.table>tfoot>tr.active>th{background-color:#ecf0f1}.table-hover>tbody>tr>td.active:hover,.table-hover>tbody>tr>th.active:hover,.table-hover>tbody>tr.active:hover>td,.table-hover>tbody>tr:hover>.active,.table-hover>tbody>tr.active:hover>th{background-color:#dde4e6}.table>thead>tr>td.success,.table>tbody>tr>td.success,.table>tfoot>tr>td.success,.table>thead>tr>th.success,.table>tbody>tr>th.success,.table>tfoot>tr>th.success,.table>thead>tr.success>td,.table>tbody>tr.success>td,.table>tfoot>tr.success>td,.table>thead>tr.success>th,.table>tbody>tr.success>th,.table>tfoot>tr.success>th{background-color:#18bc9c}.table-hover>tbody>tr>td.success:hover,.table-hover>tbody>tr>th.success:hover,.table-hover>tbody>tr.success:hover>td,.table-hover>tbody>tr:hover>.success,.table-hover>tbody>tr.success:hover>th{background-color:#15a589}.table>thead>tr>td.info,.table>tbody>tr>td.info,.table>tfoot>tr>td.info,.table>thead>tr>th.info,.table>tbody>tr>th.info,.table>tfoot>tr>th.info,.table>thead>tr.info>td,.table>tbody>tr.info>td,.table>tfoot>tr.info>td,.table>thead>tr.info>th,.table>tbody>tr.info>th,.table>tfoot>tr.info>th{background-color:#3498db}.table-hover>tbody>tr>td.info:hover,.table-hover>tbody>tr>th.info:hover,.table-hover>tbody>tr.info:hover>td,.table-hover>tbody>tr:hover>.info,.table-hover>tbody>tr.info:hover>th{background-color:#258cd1}.table>thead>tr>td.warning,.table>tbody>tr>td.warning,.table>tfoot>tr>td.warning,.table>thead>tr>th.warning,.table>tbody>tr>th.warning,.table>tfoot>tr>th.warning,.table>thead>tr.warning>td,.table>tbody>tr.warning>td,.table>tfoot>tr.warning>td,.table>thead>tr.warning>th,.table>tbody>tr.warning>th,.table>tfoot>tr.warning>th{background-color:#f39c12}.table-hover>tbody>tr>td.warning:hover,.table-hover>tbody>tr>th.warning:hover,.table-hover>tbody>tr.warning:hover>td,.table-hover>tbody>tr:hover>.warning,.table-hover>tbody>tr.warning:hover>th{background-color:#e08e0b}.table>thead>tr>td.danger,.table>tbody>tr>td.danger,.table>tfoot>tr>td.danger,.table>thead>tr>th.danger,.table>tbody>tr>th.danger,.table>tfoot>tr>th.danger,.table>thead>tr.danger>td,.table>tbody>tr.danger>td,.table>tfoot>tr.danger>td,.table>thead>tr.danger>th,.table>tbody>tr.danger>th,.table>tfoot>tr.danger>th{background-color:#e74c3c}.table-hover>tbody>tr>td.danger:hover,.table-hover>tbody>tr>th.danger:hover,.table-hover>tbody>tr.danger:hover>td,.table-hover>tbody>tr:hover>.danger,.table-hover>tbody>tr.danger:hover>th{background-color:#e43725}.table-responsive{overflow-x:auto;min-height:0.01%}@media screen and (max-width:767px){.table-responsive{width:100%;margin-bottom:15.75px;overflow-y:hidden;-ms-overflow-style:-ms-autohiding-scrollbar;border:1px solid #ecf0f1}.table-responsive>.table{margin-bottom:0}.table-responsive>.table>thead>tr>th,.table-responsive>.table>tbody>tr>th,.table-responsive>.table>tfoot>tr>th,.table-responsive>.table>thead>tr>td,.table-responsive>.table>tbody>tr>td,.table-responsive>.table>tfoot>tr>td{white-space:nowrap}.table-responsive>.table-bordered{border:0}.table-responsive>.table-bordered>thead>tr>th:first-child,.table-responsive>.table-bordered>tbody>tr>th:first-child,.table-responsive>.table-bordered>tfoot>tr>th:first-child,.table-responsive>.table-bordered>thead>tr>td:first-child,.table-responsive>.table-bordered>tbody>tr>td:first-child,.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.table-responsive>.table-bordered>thead>tr>th:last-child,.table-responsive>.table-bordered>tbody>tr>th:last-child,.table-responsive>.table-bordered>tfoot>tr>th:last-child,.table-responsive>.table-bordered>thead>tr>td:last-child,.table-responsive>.table-bordered>tbody>tr>td:last-child,.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.table-responsive>.table-bordered>tbody>tr:last-child>th,.table-responsive>.table-bordered>tfoot>tr:last-child>th,.table-responsive>.table-bordered>tbody>tr:last-child>td,.table-responsive>.table-bordered>tfoot>tr:last-child>td{border-bottom:0}}fieldset{padding:0;margin:0;border:0;min-width:0}legend{display:block;width:100%;padding:0;margin-bottom:21px;font-size:22.5px;line-height:inherit;color:#2c3e50;border:0;border-bottom:1px solid transparent}label{display:inline-block;max-width:100%;margin-bottom:5px;font-weight:bold}input[type="search"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}input[type="radio"],input[type="checkbox"]{margin:4px 0 0;margin-top:1px \9;line-height:normal}input[type="file"]{display:block}input[type="range"]{display:block;width:100%}select[multiple],select[size]{height:auto}input[type="file"]:focus,input[type="radio"]:focus,input[type="checkbox"]:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}output{display:block;padding-top:11px;font-size:15px;line-height:1.42857143;color:#2c3e50}.form-control{display:block;width:100%;height:43px;padding:10px 15px;font-size:15px;line-height:1.42857143;color:#2c3e50;background-color:#ffffff;background-image:none;border:1px solid #dce4ec;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);-webkit-transition:border-color ease-in-out .15s,-webkit-box-shadow ease-in-out .15s;-o-transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s;transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s}.form-control:focus{border-color:#2c3e50;outline:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(44,62,80,0.6);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(44,62,80,0.6)}.form-control::-moz-placeholder{color:#acb6c0;opacity:1}.form-control:-ms-input-placeholder{color:#acb6c0}.form-control::-webkit-input-placeholder{color:#acb6c0}.form-control[disabled],.form-control[readonly],fieldset[disabled] .form-control{cursor:not-allowed;background-color:#ecf0f1;opacity:1}textarea.form-control{height:auto}input[type="search"]{-webkit-appearance:none}@media screen and (-webkit-min-device-pixel-ratio:0){input[type="date"],input[type="time"],input[type="datetime-local"],input[type="month"]{line-height:43px}input[type="date"].input-sm,input[type="time"].input-sm,input[type="datetime-local"].input-sm,input[type="month"].input-sm{line-height:33px}input[type="date"].input-lg,input[type="time"].input-lg,input[type="datetime-local"].input-lg,input[type="month"].input-lg{line-height:64px}}.form-group{margin-bottom:15px}.radio,.checkbox{position:relative;display:block;margin-top:10px;margin-bottom:10px}.radio label,.checkbox label{min-height:21px;padding-left:20px;margin-bottom:0;font-weight:normal;cursor:pointer}.radio input[type="radio"],.radio-inline input[type="radio"],.checkbox input[type="checkbox"],.checkbox-inline input[type="checkbox"]{position:absolute;margin-left:-20px;margin-top:4px \9}.radio+.radio,.checkbox+.checkbox{margin-top:-5px}.radio-inline,.checkbox-inline{display:inline-block;padding-left:20px;margin-bottom:0;vertical-align:middle;font-weight:normal;cursor:pointer}.radio-inline+.radio-inline,.checkbox-inline+.checkbox-inline{margin-top:0;margin-left:10px}input[type="radio"][disabled],input[type="checkbox"][disabled],input[type="radio"].disabled,input[type="checkbox"].disabled,fieldset[disabled] input[type="radio"],fieldset[disabled] input[type="checkbox"]{cursor:not-allowed}.radio-inline.disabled,.checkbox-inline.disabled,fieldset[disabled] .radio-inline,fieldset[disabled] .checkbox-inline{cursor:not-allowed}.radio.disabled label,.checkbox.disabled label,fieldset[disabled] .radio label,fieldset[disabled] .checkbox label{cursor:not-allowed}.form-control-static{padding-top:11px;padding-bottom:11px;margin-bottom:0}.form-control-static.input-lg,.form-control-static.input-sm{padding-left:0;padding-right:0}.input-sm,.form-group-sm .form-control{height:33px;padding:6px 9px;font-size:13px;line-height:1.5;border-radius:3px}select.input-sm,select.form-group-sm .form-control{height:33px;line-height:33px}textarea.input-sm,textarea.form-group-sm .form-control,select[multiple].input-sm,select[multiple].form-group-sm .form-control{height:auto}.input-lg,.form-group-lg .form-control{height:64px;padding:18px 27px;font-size:19px;line-height:1.33;border-radius:6px}select.input-lg,select.form-group-lg .form-control{height:64px;line-height:64px}textarea.input-lg,textarea.form-group-lg .form-control,select[multiple].input-lg,select[multiple].form-group-lg .form-control{height:auto}.has-feedback{position:relative}.has-feedback .form-control{padding-right:53.75px}.form-control-feedback{position:absolute;top:0;right:0;z-index:2;display:block;width:43px;height:43px;line-height:43px;text-align:center;pointer-events:none}.input-lg+.form-control-feedback{width:64px;height:64px;line-height:64px}.input-sm+.form-control-feedback{width:33px;height:33px;line-height:33px}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success.radio label,.has-success.checkbox label,.has-success.radio-inline label,.has-success.checkbox-inline label{color:#ffffff}.has-success .form-control{border-color:#ffffff;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-success .form-control:focus{border-color:#e6e6e6;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff}.has-success .input-group-addon{color:#ffffff;border-color:#ffffff;background-color:#18bc9c}.has-success .form-control-feedback{color:#ffffff}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning.radio label,.has-warning.checkbox label,.has-warning.radio-inline label,.has-warning.checkbox-inline label{color:#ffffff}.has-warning .form-control{border-color:#ffffff;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-warning .form-control:focus{border-color:#e6e6e6;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff}.has-warning .input-group-addon{color:#ffffff;border-color:#ffffff;background-color:#f39c12}.has-warning .form-control-feedback{color:#ffffff}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error.radio label,.has-error.checkbox label,.has-error.radio-inline label,.has-error.checkbox-inline label{color:#ffffff}.has-error .form-control{border-color:#ffffff;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-error .form-control:focus{border-color:#e6e6e6;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #fff}.has-error .input-group-addon{color:#ffffff;border-color:#ffffff;background-color:#e74c3c}.has-error .form-control-feedback{color:#ffffff}.has-feedback label~.form-control-feedback{top:26px}.has-feedback label.sr-only~.form-control-feedback{top:0}.help-block{display:block;margin-top:5px;margin-bottom:10px;color:#597ea2}@media (min-width:768px){.form-inline .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.form-inline .form-control{display:inline-block;width:auto;vertical-align:middle}.form-inline .form-control-static{display:inline-block}.form-inline .input-group{display:inline-table;vertical-align:middle}.form-inline .input-group .input-group-addon,.form-inline .input-group .input-group-btn,.form-inline .input-group .form-control{width:auto}.form-inline .input-group>.form-control{width:100%}.form-inline .control-label{margin-bottom:0;vertical-align:middle}.form-inline .radio,.form-inline .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.form-inline .radio label,.form-inline .checkbox label{padding-left:0}.form-inline .radio input[type="radio"],.form-inline .checkbox input[type="checkbox"]{position:relative;margin-left:0}.form-inline .has-feedback .form-control-feedback{top:0}}.form-horizontal .radio,.form-horizontal .checkbox,.form-horizontal .radio-inline,.form-horizontal .checkbox-inline{margin-top:0;margin-bottom:0;padding-top:11px}.form-horizontal .radio,.form-horizontal .checkbox{min-height:32px}.form-horizontal .form-group{margin-left:-15px;margin-right:-15px}@media (min-width:768px){.form-horizontal .control-label{text-align:right;margin-bottom:0;padding-top:11px}}.form-horizontal .has-feedback .form-control-feedback{right:15px}@media (min-width:768px){.form-horizontal .form-group-lg .control-label{padding-top:24.94px}}@media (min-width:768px){.form-horizontal .form-group-sm .control-label{padding-top:7px}}.btn{display:inline-block;margin-bottom:0;font-weight:normal;text-align:center;vertical-align:middle;-ms-touch-action:manipulation;touch-action:manipulation;cursor:pointer;background-image:none;border:1px solid transparent;white-space:nowrap;padding:10px 15px;font-size:15px;line-height:1.42857143;border-radius:4px;-webkit-user-select:none;-moz-user-select:none;-ms-user-select:none;user-select:none}.btn:focus,.btn:active:focus,.btn.active:focus,.btn.focus,.btn:active.focus,.btn.active.focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}.btn:hover,.btn:focus,.btn.focus{color:#ffffff;text-decoration:none}.btn:active,.btn.active{outline:0;background-image:none;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn.disabled,.btn[disabled],fieldset[disabled] .btn{cursor:not-allowed;pointer-events:none;opacity:0.65;filter:alpha(opacity=65);-webkit-box-shadow:none;box-shadow:none}.btn-default{color:#ffffff;background-color:#95a5a6;border-color:#95a5a6}.btn-default:hover,.btn-default:focus,.btn-default.focus,.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{color:#ffffff;background-color:#798d8f;border-color:#74898a}.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{background-image:none}.btn-default.disabled,.btn-default[disabled],fieldset[disabled] .btn-default,.btn-default.disabled:hover,.btn-default[disabled]:hover,fieldset[disabled] .btn-default:hover,.btn-default.disabled:focus,.btn-default[disabled]:focus,fieldset[disabled] .btn-default:focus,.btn-default.disabled.focus,.btn-default[disabled].focus,fieldset[disabled] .btn-default.focus,.btn-default.disabled:active,.btn-default[disabled]:active,fieldset[disabled] .btn-default:active,.btn-default.disabled.active,.btn-default[disabled].active,fieldset[disabled] .btn-default.active{background-color:#95a5a6;border-color:#95a5a6}.btn-default .badge{color:#95a5a6;background-color:#ffffff}.btn-primary{color:#ffffff;background-color:#2c3e50;border-color:#2c3e50}.btn-primary:hover,.btn-primary:focus,.btn-primary.focus,.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{color:#ffffff;background-color:#1a242f;border-color:#161f29}.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{background-image:none}.btn-primary.disabled,.btn-primary[disabled],fieldset[disabled] .btn-primary,.btn-primary.disabled:hover,.btn-primary[disabled]:hover,fieldset[disabled] .btn-primary:hover,.btn-primary.disabled:focus,.btn-primary[disabled]:focus,fieldset[disabled] .btn-primary:focus,.btn-primary.disabled.focus,.btn-primary[disabled].focus,fieldset[disabled] .btn-primary.focus,.btn-primary.disabled:active,.btn-primary[disabled]:active,fieldset[disabled] .btn-primary:active,.btn-primary.disabled.active,.btn-primary[disabled].active,fieldset[disabled] .btn-primary.active{background-color:#2c3e50;border-color:#2c3e50}.btn-primary .badge{color:#2c3e50;background-color:#ffffff}.btn-success{color:#ffffff;background-color:#18bc9c;border-color:#18bc9c}.btn-success:hover,.btn-success:focus,.btn-success.focus,.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{color:#ffffff;background-color:#128f76;border-color:#11866f}.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{background-image:none}.btn-success.disabled,.btn-success[disabled],fieldset[disabled] .btn-success,.btn-success.disabled:hover,.btn-success[disabled]:hover,fieldset[disabled] .btn-success:hover,.btn-success.disabled:focus,.btn-success[disabled]:focus,fieldset[disabled] .btn-success:focus,.btn-success.disabled.focus,.btn-success[disabled].focus,fieldset[disabled] .btn-success.focus,.btn-success.disabled:active,.btn-success[disabled]:active,fieldset[disabled] .btn-success:active,.btn-success.disabled.active,.btn-success[disabled].active,fieldset[disabled] .btn-success.active{background-color:#18bc9c;border-color:#18bc9c}.btn-success .badge{color:#18bc9c;background-color:#ffffff}.btn-info{color:#ffffff;background-color:#3498db;border-color:#3498db}.btn-info:hover,.btn-info:focus,.btn-info.focus,.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{color:#ffffff;background-color:#217dbb;border-color:#2077b2}.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{background-image:none}.btn-info.disabled,.btn-info[disabled],fieldset[disabled] .btn-info,.btn-info.disabled:hover,.btn-info[disabled]:hover,fieldset[disabled] .btn-info:hover,.btn-info.disabled:focus,.btn-info[disabled]:focus,fieldset[disabled] .btn-info:focus,.btn-info.disabled.focus,.btn-info[disabled].focus,fieldset[disabled] .btn-info.focus,.btn-info.disabled:active,.btn-info[disabled]:active,fieldset[disabled] .btn-info:active,.btn-info.disabled.active,.btn-info[disabled].active,fieldset[disabled] .btn-info.active{background-color:#3498db;border-color:#3498db}.btn-info .badge{color:#3498db;background-color:#ffffff}.btn-warning{color:#ffffff;background-color:#f39c12;border-color:#f39c12}.btn-warning:hover,.btn-warning:focus,.btn-warning.focus,.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{color:#ffffff;background-color:#c87f0a;border-color:#be780a}.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{background-image:none}.btn-warning.disabled,.btn-warning[disabled],fieldset[disabled] .btn-warning,.btn-warning.disabled:hover,.btn-warning[disabled]:hover,fieldset[disabled] .btn-warning:hover,.btn-warning.disabled:focus,.btn-warning[disabled]:focus,fieldset[disabled] .btn-warning:focus,.btn-warning.disabled.focus,.btn-warning[disabled].focus,fieldset[disabled] .btn-warning.focus,.btn-warning.disabled:active,.btn-warning[disabled]:active,fieldset[disabled] .btn-warning:active,.btn-warning.disabled.active,.btn-warning[disabled].active,fieldset[disabled] .btn-warning.active{background-color:#f39c12;border-color:#f39c12}.btn-warning .badge{color:#f39c12;background-color:#ffffff}.btn-danger{color:#ffffff;background-color:#e74c3c;border-color:#e74c3c}.btn-danger:hover,.btn-danger:focus,.btn-danger.focus,.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{color:#ffffff;background-color:#d62c1a;border-color:#cd2a19}.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{background-image:none}.btn-danger.disabled,.btn-danger[disabled],fieldset[disabled] .btn-danger,.btn-danger.disabled:hover,.btn-danger[disabled]:hover,fieldset[disabled] .btn-danger:hover,.btn-danger.disabled:focus,.btn-danger[disabled]:focus,fieldset[disabled] .btn-danger:focus,.btn-danger.disabled.focus,.btn-danger[disabled].focus,fieldset[disabled] .btn-danger.focus,.btn-danger.disabled:active,.btn-danger[disabled]:active,fieldset[disabled] .btn-danger:active,.btn-danger.disabled.active,.btn-danger[disabled].active,fieldset[disabled] .btn-danger.active{background-color:#e74c3c;border-color:#e74c3c}.btn-danger .badge{color:#e74c3c;background-color:#ffffff}.btn-link{color:#18bc9c;font-weight:normal;border-radius:0}.btn-link,.btn-link:active,.btn-link.active,.btn-link[disabled],fieldset[disabled] .btn-link{background-color:transparent;-webkit-box-shadow:none;box-shadow:none}.btn-link,.btn-link:hover,.btn-link:focus,.btn-link:active{border-color:transparent}.btn-link:hover,.btn-link:focus{color:#18bc9c;text-decoration:underline;background-color:transparent}.btn-link[disabled]:hover,fieldset[disabled] .btn-link:hover,.btn-link[disabled]:focus,fieldset[disabled] .btn-link:focus{color:#b4bcc2;text-decoration:none}.btn-lg,.btn-group-lg>.btn{padding:18px 27px;font-size:19px;line-height:1.33;border-radius:6px}.btn-sm,.btn-group-sm>.btn{padding:6px 9px;font-size:13px;line-height:1.5;border-radius:3px}.btn-xs,.btn-group-xs>.btn{padding:1px 5px;font-size:13px;line-height:1.5;border-radius:3px}.btn-block{display:block;width:100%}.btn-block+.btn-block{margin-top:5px}input[type="submit"].btn-block,input[type="reset"].btn-block,input[type="button"].btn-block{width:100%}.fade{opacity:0;-webkit-transition:opacity 0.15s linear;-o-transition:opacity 0.15s linear;transition:opacity 0.15s linear}.fade.in{opacity:1}.collapse{display:none;visibility:hidden}.collapse.in{display:block;visibility:visible}tr.collapse.in{display:table-row}tbody.collapse.in{display:table-row-group}.collapsing{position:relative;height:0;overflow:hidden;-webkit-transition-property:height, visibility;-o-transition-property:height, visibility;transition-property:height, visibility;-webkit-transition-duration:0.35s;-o-transition-duration:0.35s;transition-duration:0.35s;-webkit-transition-timing-function:ease;-o-transition-timing-function:ease;transition-timing-function:ease}.caret{display:inline-block;width:0;height:0;margin-left:2px;vertical-align:middle;border-top:4px solid;border-right:4px solid transparent;border-left:4px solid transparent}.dropdown{position:relative}.dropdown-toggle:focus{outline:0}.dropdown-menu{position:absolute;top:100%;left:0;z-index:1000;display:none;float:left;min-width:160px;padding:5px 0;margin:2px 0 0;list-style:none;font-size:15px;text-align:left;background-color:#ffffff;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.15);border-radius:4px;-webkit-box-shadow:0 6px 12px rgba(0,0,0,0.175);box-shadow:0 6px 12px rgba(0,0,0,0.175);-webkit-background-clip:padding-box;background-clip:padding-box}.dropdown-menu.pull-right{right:0;left:auto}.dropdown-menu .divider{height:1px;margin:9.5px 0;overflow:hidden;background-color:#e5e5e5}.dropdown-menu>li>a{display:block;padding:3px 20px;clear:both;font-weight:normal;line-height:1.42857143;color:#7b8a8b;white-space:nowrap}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{text-decoration:none;color:#ffffff;background-color:#2c3e50}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{color:#ffffff;text-decoration:none;outline:0;background-color:#2c3e50}.dropdown-menu>.disabled>a,.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{color:#b4bcc2}.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{text-decoration:none;background-color:transparent;background-image:none;filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);cursor:not-allowed}.open>.dropdown-menu{display:block}.open>a{outline:0}.dropdown-menu-right{left:auto;right:0}.dropdown-menu-left{left:0;right:auto}.dropdown-header{display:block;padding:3px 20px;font-size:13px;line-height:1.42857143;color:#b4bcc2;white-space:nowrap}.dropdown-backdrop{position:fixed;left:0;right:0;bottom:0;top:0;z-index:990}.pull-right>.dropdown-menu{right:0;left:auto}.dropup .caret,.navbar-fixed-bottom .dropdown .caret{border-top:0;border-bottom:4px solid;content:""}.dropup .dropdown-menu,.navbar-fixed-bottom .dropdown .dropdown-menu{top:auto;bottom:100%;margin-bottom:1px}@media (min-width:768px){.navbar-right .dropdown-menu{left:auto;right:0}.navbar-right .dropdown-menu-left{left:0;right:auto}}.btn-group,.btn-group-vertical{position:relative;display:inline-block;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;float:left}.btn-group>.btn:hover,.btn-group-vertical>.btn:hover,.btn-group>.btn:focus,.btn-group-vertical>.btn:focus,.btn-group>.btn:active,.btn-group-vertical>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn.active{z-index:2}.btn-group .btn+.btn,.btn-group .btn+.btn-group,.btn-group .btn-group+.btn,.btn-group .btn-group+.btn-group{margin-left:-1px}.btn-toolbar{margin-left:-5px}.btn-toolbar .btn-group,.btn-toolbar .input-group{float:left}.btn-toolbar>.btn,.btn-toolbar>.btn-group,.btn-toolbar>.input-group{margin-left:5px}.btn-group>.btn:not(:first-child):not(:last-child):not(.dropdown-toggle){border-radius:0}.btn-group>.btn:first-child{margin-left:0}.btn-group>.btn:first-child:not(:last-child):not(.dropdown-toggle){border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn:last-child:not(:first-child),.btn-group>.dropdown-toggle:not(:first-child){border-bottom-left-radius:0;border-top-left-radius:0}.btn-group>.btn-group{float:left}.btn-group>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group>.btn-group:first-child>.btn:last-child,.btn-group>.btn-group:first-child>.dropdown-toggle{border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn-group:last-child>.btn:first-child{border-bottom-left-radius:0;border-top-left-radius:0}.btn-group .dropdown-toggle:active,.btn-group.open .dropdown-toggle{outline:0}.btn-group>.btn+.dropdown-toggle{padding-left:8px;padding-right:8px}.btn-group>.btn-lg+.dropdown-toggle{padding-left:12px;padding-right:12px}.btn-group.open .dropdown-toggle{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn-group.open .dropdown-toggle.btn-link{-webkit-box-shadow:none;box-shadow:none}.btn .caret{margin-left:0}.btn-lg .caret{border-width:5px 5px 0;border-bottom-width:0}.dropup .btn-lg .caret{border-width:0 5px 5px}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group,.btn-group-vertical>.btn-group>.btn{display:block;float:none;width:100%;max-width:100%}.btn-group-vertical>.btn-group>.btn{float:none}.btn-group-vertical>.btn+.btn,.btn-group-vertical>.btn+.btn-group,.btn-group-vertical>.btn-group+.btn,.btn-group-vertical>.btn-group+.btn-group{margin-top:-1px;margin-left:0}.btn-group-vertical>.btn:not(:first-child):not(:last-child){border-radius:0}.btn-group-vertical>.btn:first-child:not(:last-child){border-top-right-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn:last-child:not(:first-child){border-bottom-left-radius:4px;border-top-right-radius:0;border-top-left-radius:0}.btn-group-vertical>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group-vertical>.btn-group:first-child:not(:last-child)>.btn:last-child,.btn-group-vertical>.btn-group:first-child:not(:last-child)>.dropdown-toggle{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn-group:last-child:not(:first-child)>.btn:first-child{border-top-right-radius:0;border-top-left-radius:0}.btn-group-justified{display:table;width:100%;table-layout:fixed;border-collapse:separate}.btn-group-justified>.btn,.btn-group-justified>.btn-group{float:none;display:table-cell;width:1%}.btn-group-justified>.btn-group .btn{width:100%}.btn-group-justified>.btn-group .dropdown-menu{left:auto}[data-toggle="buttons"]>.btn input[type="radio"],[data-toggle="buttons"]>.btn-group>.btn input[type="radio"],[data-toggle="buttons"]>.btn input[type="checkbox"],[data-toggle="buttons"]>.btn-group>.btn input[type="checkbox"]{position:absolute;clip:rect(0, 0, 0, 0);pointer-events:none}.input-group{position:relative;display:table;border-collapse:separate}.input-group[class*="col-"]{float:none;padding-left:0;padding-right:0}.input-group .form-control{position:relative;z-index:2;float:left;width:100%;margin-bottom:0}.input-group-lg>.form-control,.input-group-lg>.input-group-addon,.input-group-lg>.input-group-btn>.btn{height:64px;padding:18px 27px;font-size:19px;line-height:1.33;border-radius:6px}select.input-group-lg>.form-control,select.input-group-lg>.input-group-addon,select.input-group-lg>.input-group-btn>.btn{height:64px;line-height:64px}textarea.input-group-lg>.form-control,textarea.input-group-lg>.input-group-addon,textarea.input-group-lg>.input-group-btn>.btn,select[multiple].input-group-lg>.form-control,select[multiple].input-group-lg>.input-group-addon,select[multiple].input-group-lg>.input-group-btn>.btn{height:auto}.input-group-sm>.form-control,.input-group-sm>.input-group-addon,.input-group-sm>.input-group-btn>.btn{height:33px;padding:6px 9px;font-size:13px;line-height:1.5;border-radius:3px}select.input-group-sm>.form-control,select.input-group-sm>.input-group-addon,select.input-group-sm>.input-group-btn>.btn{height:33px;line-height:33px}textarea.input-group-sm>.form-control,textarea.input-group-sm>.input-group-addon,textarea.input-group-sm>.input-group-btn>.btn,select[multiple].input-group-sm>.form-control,select[multiple].input-group-sm>.input-group-addon,select[multiple].input-group-sm>.input-group-btn>.btn{height:auto}.input-group-addon,.input-group-btn,.input-group .form-control{display:table-cell}.input-group-addon:not(:first-child):not(:last-child),.input-group-btn:not(:first-child):not(:last-child),.input-group .form-control:not(:first-child):not(:last-child){border-radius:0}.input-group-addon,.input-group-btn{width:1%;white-space:nowrap;vertical-align:middle}.input-group-addon{padding:10px 15px;font-size:15px;font-weight:normal;line-height:1;color:#2c3e50;text-align:center;background-color:#ecf0f1;border:1px solid #dce4ec;border-radius:4px}.input-group-addon.input-sm{padding:6px 9px;font-size:13px;border-radius:3px}.input-group-addon.input-lg{padding:18px 27px;font-size:19px;border-radius:6px}.input-group-addon input[type="radio"],.input-group-addon input[type="checkbox"]{margin-top:0}.input-group .form-control:first-child,.input-group-addon:first-child,.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group>.btn,.input-group-btn:first-child>.dropdown-toggle,.input-group-btn:last-child>.btn:not(:last-child):not(.dropdown-toggle),.input-group-btn:last-child>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-top-right-radius:0}.input-group-addon:first-child{border-right:0}.input-group .form-control:last-child,.input-group-addon:last-child,.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group>.btn,.input-group-btn:last-child>.dropdown-toggle,.input-group-btn:first-child>.btn:not(:first-child),.input-group-btn:first-child>.btn-group:not(:first-child)>.btn{border-bottom-left-radius:0;border-top-left-radius:0}.input-group-addon:last-child{border-left:0}.input-group-btn{position:relative;font-size:0;white-space:nowrap}.input-group-btn>.btn{position:relative}.input-group-btn>.btn+.btn{margin-left:-1px}.input-group-btn>.btn:hover,.input-group-btn>.btn:focus,.input-group-btn>.btn:active{z-index:2}.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group{margin-right:-1px}.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group{margin-left:-1px}.nav{margin-bottom:0;padding-left:0;list-style:none}.nav>li{position:relative;display:block}.nav>li>a{position:relative;display:block;padding:10px 15px}.nav>li>a:hover,.nav>li>a:focus{text-decoration:none;background-color:#ecf0f1}.nav>li.disabled>a{color:#b4bcc2}.nav>li.disabled>a:hover,.nav>li.disabled>a:focus{color:#b4bcc2;text-decoration:none;background-color:transparent;cursor:not-allowed}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{background-color:#ecf0f1;border-color:#18bc9c}.nav .nav-divider{height:1px;margin:9.5px 0;overflow:hidden;background-color:#e5e5e5}.nav>li>a>img{max-width:none}.nav-tabs{border-bottom:1px solid #ecf0f1}.nav-tabs>li{float:left;margin-bottom:-1px}.nav-tabs>li>a{margin-right:2px;line-height:1.42857143;border:1px solid transparent;border-radius:4px 4px 0 0}.nav-tabs>li>a:hover{border-color:#ecf0f1 #ecf0f1 #ecf0f1}.nav-tabs>li.active>a,.nav-tabs>li.active>a:hover,.nav-tabs>li.active>a:focus{color:#2c3e50;background-color:#ffffff;border:1px solid #ecf0f1;border-bottom-color:transparent;cursor:default}.nav-tabs.nav-justified{width:100%;border-bottom:0}.nav-tabs.nav-justified>li{float:none}.nav-tabs.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-tabs.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-tabs.nav-justified>li{display:table-cell;width:1%}.nav-tabs.nav-justified>li>a{margin-bottom:0}}.nav-tabs.nav-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border:1px solid #ecf0f1}@media (min-width:768px){.nav-tabs.nav-justified>li>a{border-bottom:1px solid #ecf0f1;border-radius:4px 4px 0 0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border-bottom-color:#ffffff}}.nav-pills>li{float:left}.nav-pills>li>a{border-radius:4px}.nav-pills>li+li{margin-left:2px}.nav-pills>li.active>a,.nav-pills>li.active>a:hover,.nav-pills>li.active>a:focus{color:#ffffff;background-color:#2c3e50}.nav-stacked>li{float:none}.nav-stacked>li+li{margin-top:2px;margin-left:0}.nav-justified{width:100%}.nav-justified>li{float:none}.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-justified>li{display:table-cell;width:1%}.nav-justified>li>a{margin-bottom:0}}.nav-tabs-justified{border-bottom:0}.nav-tabs-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border:1px solid #ecf0f1}@media (min-width:768px){.nav-tabs-justified>li>a{border-bottom:1px solid #ecf0f1;border-radius:4px 4px 0 0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border-bottom-color:#ffffff}}.tab-content>.tab-pane{display:none;visibility:hidden}.tab-content>.active{display:block;visibility:visible}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-right-radius:0;border-top-left-radius:0}.navbar{position:relative;min-height:60px;margin-bottom:21px;border:1px solid transparent}@media (min-width:768px){.navbar{border-radius:4px}}@media (min-width:768px){.navbar-header{float:left}}.navbar-collapse{overflow-x:visible;padding-right:15px;padding-left:15px;border-top:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);-webkit-overflow-scrolling:touch}.navbar-collapse.in{overflow-y:auto}@media (min-width:768px){.navbar-collapse{width:auto;border-top:0;-webkit-box-shadow:none;box-shadow:none}.navbar-collapse.collapse{display:block !important;visibility:visible !important;height:auto !important;padding-bottom:0;overflow:visible !important}.navbar-collapse.in{overflow-y:visible}.navbar-fixed-top .navbar-collapse,.navbar-static-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{padding-left:0;padding-right:0}}.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:340px}@media (max-device-width:480px) and (orientation:landscape){.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:200px}}.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:0;margin-left:0}}.navbar-static-top{z-index:1000;border-width:0 0 1px}@media (min-width:768px){.navbar-static-top{border-radius:0}}.navbar-fixed-top,.navbar-fixed-bottom{position:fixed;right:0;left:0;z-index:1030}@media (min-width:768px){.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}}.navbar-fixed-top{top:0;border-width:0 0 1px}.navbar-fixed-bottom{bottom:0;margin-bottom:0;border-width:1px 0 0}.navbar-brand{float:left;padding:19.5px 15px;font-size:19px;line-height:21px;height:60px}.navbar-brand:hover,.navbar-brand:focus{text-decoration:none}.navbar-brand>img{display:block}@media (min-width:768px){.navbar>.container .navbar-brand,.navbar>.container-fluid .navbar-brand{margin-left:-15px}}.navbar-toggle{position:relative;float:right;margin-right:15px;padding:9px 10px;margin-top:13px;margin-bottom:13px;background-color:transparent;background-image:none;border:1px solid transparent;border-radius:4px}.navbar-toggle:focus{outline:0}.navbar-toggle .icon-bar{display:block;width:22px;height:2px;border-radius:1px}.navbar-toggle .icon-bar+.icon-bar{margin-top:4px}@media (min-width:768px){.navbar-toggle{display:none}}.navbar-nav{margin:9.75px -15px}.navbar-nav>li>a{padding-top:10px;padding-bottom:10px;line-height:21px}@media (max-width:767px){.navbar-nav .open .dropdown-menu{position:static;float:none;width:auto;margin-top:0;background-color:transparent;border:0;-webkit-box-shadow:none;box-shadow:none}.navbar-nav .open .dropdown-menu>li>a,.navbar-nav .open .dropdown-menu .dropdown-header{padding:5px 15px 5px 25px}.navbar-nav .open .dropdown-menu>li>a{line-height:21px}.navbar-nav .open .dropdown-menu>li>a:hover,.navbar-nav .open .dropdown-menu>li>a:focus{background-image:none}}@media (min-width:768px){.navbar-nav{float:left;margin:0}.navbar-nav>li{float:left}.navbar-nav>li>a{padding-top:19.5px;padding-bottom:19.5px}}.navbar-form{margin-left:-15px;margin-right:-15px;padding:10px 15px;border-top:1px solid transparent;border-bottom:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);margin-top:8.5px;margin-bottom:8.5px}@media (min-width:768px){.navbar-form .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.navbar-form .form-control{display:inline-block;width:auto;vertical-align:middle}.navbar-form .form-control-static{display:inline-block}.navbar-form .input-group{display:inline-table;vertical-align:middle}.navbar-form .input-group .input-group-addon,.navbar-form .input-group .input-group-btn,.navbar-form .input-group .form-control{width:auto}.navbar-form .input-group>.form-control{width:100%}.navbar-form .control-label{margin-bottom:0;vertical-align:middle}.navbar-form .radio,.navbar-form .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.navbar-form .radio label,.navbar-form .checkbox label{padding-left:0}.navbar-form .radio input[type="radio"],.navbar-form .checkbox input[type="checkbox"]{position:relative;margin-left:0}.navbar-form .has-feedback .form-control-feedback{top:0}}@media (max-width:767px){.navbar-form .form-group{margin-bottom:5px}.navbar-form .form-group:last-child{margin-bottom:0}}@media (min-width:768px){.navbar-form{width:auto;border:0;margin-left:0;margin-right:0;padding-top:0;padding-bottom:0;-webkit-box-shadow:none;box-shadow:none}}.navbar-nav>li>.dropdown-menu{margin-top:0;border-top-right-radius:0;border-top-left-radius:0}.navbar-fixed-bottom .navbar-nav>li>.dropdown-menu{border-top-right-radius:4px;border-top-left-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.navbar-btn{margin-top:8.5px;margin-bottom:8.5px}.navbar-btn.btn-sm{margin-top:13.5px;margin-bottom:13.5px}.navbar-btn.btn-xs{margin-top:19px;margin-bottom:19px}.navbar-text{margin-top:19.5px;margin-bottom:19.5px}@media (min-width:768px){.navbar-text{float:left;margin-left:15px;margin-right:15px}}@media (min-width:768px){.navbar-left{float:left !important}.navbar-right{float:right !important;margin-right:-15px}.navbar-right~.navbar-right{margin-right:0}}.navbar-default{background-color:#2c3e50;border-color:transparent}.navbar-default .navbar-brand{color:#ffffff}.navbar-default .navbar-brand:hover,.navbar-default .navbar-brand:focus{color:#18bc9c;background-color:transparent}.navbar-default .navbar-text{color:#777777}.navbar-default .navbar-nav>li>a{color:#ffffff}.navbar-default .navbar-nav>li>a:hover,.navbar-default .navbar-nav>li>a:focus{color:#18bc9c;background-color:transparent}.navbar-default .navbar-nav>.active>a,.navbar-default .navbar-nav>.active>a:hover,.navbar-default .navbar-nav>.active>a:focus{color:#ffffff;background-color:#1a242f}.navbar-default .navbar-nav>.disabled>a,.navbar-default .navbar-nav>.disabled>a:hover,.navbar-default .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-default .navbar-toggle{border-color:#1a242f}.navbar-default .navbar-toggle:hover,.navbar-default .navbar-toggle:focus{background-color:#1a242f}.navbar-default .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-default .navbar-collapse,.navbar-default .navbar-form{border-color:transparent}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.open>a:hover,.navbar-default .navbar-nav>.open>a:focus{background-color:#1a242f;color:#ffffff}@media (max-width:767px){.navbar-default .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-default .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>li>a:focus{color:#18bc9c;background-color:transparent}.navbar-default .navbar-nav .open .dropdown-menu>.active>a,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#1a242f}.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-default .navbar-link{color:#ffffff}.navbar-default .navbar-link:hover{color:#18bc9c}.navbar-default .btn-link{color:#ffffff}.navbar-default .btn-link:hover,.navbar-default .btn-link:focus{color:#18bc9c}.navbar-default .btn-link[disabled]:hover,fieldset[disabled] .navbar-default .btn-link:hover,.navbar-default .btn-link[disabled]:focus,fieldset[disabled] .navbar-default .btn-link:focus{color:#cccccc}.navbar-inverse{background-color:#18bc9c;border-color:transparent}.navbar-inverse .navbar-brand{color:#ffffff}.navbar-inverse .navbar-brand:hover,.navbar-inverse .navbar-brand:focus{color:#2c3e50;background-color:transparent}.navbar-inverse .navbar-text{color:#ffffff}.navbar-inverse .navbar-nav>li>a{color:#ffffff}.navbar-inverse .navbar-nav>li>a:hover,.navbar-inverse .navbar-nav>li>a:focus{color:#2c3e50;background-color:transparent}.navbar-inverse .navbar-nav>.active>a,.navbar-inverse .navbar-nav>.active>a:hover,.navbar-inverse .navbar-nav>.active>a:focus{color:#ffffff;background-color:#15a589}.navbar-inverse .navbar-nav>.disabled>a,.navbar-inverse .navbar-nav>.disabled>a:hover,.navbar-inverse .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-inverse .navbar-toggle{border-color:#128f76}.navbar-inverse .navbar-toggle:hover,.navbar-inverse .navbar-toggle:focus{background-color:#128f76}.navbar-inverse .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-inverse .navbar-collapse,.navbar-inverse .navbar-form{border-color:#149c82}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.open>a:hover,.navbar-inverse .navbar-nav>.open>a:focus{background-color:#15a589;color:#ffffff}@media (max-width:767px){.navbar-inverse .navbar-nav .open .dropdown-menu>.dropdown-header{border-color:transparent}.navbar-inverse .navbar-nav .open .dropdown-menu .divider{background-color:transparent}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:focus{color:#2c3e50;background-color:transparent}.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#15a589}.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-inverse .navbar-link{color:#ffffff}.navbar-inverse .navbar-link:hover{color:#2c3e50}.navbar-inverse .btn-link{color:#ffffff}.navbar-inverse .btn-link:hover,.navbar-inverse .btn-link:focus{color:#2c3e50}.navbar-inverse .btn-link[disabled]:hover,fieldset[disabled] .navbar-inverse .btn-link:hover,.navbar-inverse .btn-link[disabled]:focus,fieldset[disabled] .navbar-inverse .btn-link:focus{color:#cccccc}.breadcrumb{padding:8px 15px;margin-bottom:21px;list-style:none;background-color:#ecf0f1;border-radius:4px}.breadcrumb>li{display:inline-block}.breadcrumb>li+li:before{content:"/\00a0";padding:0 5px;color:#cccccc}.breadcrumb>.active{color:#95a5a6}.pagination{display:inline-block;padding-left:0;margin:21px 0;border-radius:4px}.pagination>li{display:inline}.pagination>li>a,.pagination>li>span{position:relative;float:left;padding:10px 15px;line-height:1.42857143;text-decoration:none;color:#ffffff;background-color:#18bc9c;border:1px solid transparent;margin-left:-1px}.pagination>li:first-child>a,.pagination>li:first-child>span{margin-left:0;border-bottom-left-radius:4px;border-top-left-radius:4px}.pagination>li:last-child>a,.pagination>li:last-child>span{border-bottom-right-radius:4px;border-top-right-radius:4px}.pagination>li>a:hover,.pagination>li>span:hover,.pagination>li>a:focus,.pagination>li>span:focus{color:#ffffff;background-color:#0f7864;border-color:transparent}.pagination>.active>a,.pagination>.active>span,.pagination>.active>a:hover,.pagination>.active>span:hover,.pagination>.active>a:focus,.pagination>.active>span:focus{z-index:2;color:#ffffff;background-color:#0f7864;border-color:transparent;cursor:default}.pagination>.disabled>span,.pagination>.disabled>span:hover,.pagination>.disabled>span:focus,.pagination>.disabled>a,.pagination>.disabled>a:hover,.pagination>.disabled>a:focus{color:#ecf0f1;background-color:#3be6c4;border-color:transparent;cursor:not-allowed}.pagination-lg>li>a,.pagination-lg>li>span{padding:18px 27px;font-size:19px}.pagination-lg>li:first-child>a,.pagination-lg>li:first-child>span{border-bottom-left-radius:6px;border-top-left-radius:6px}.pagination-lg>li:last-child>a,.pagination-lg>li:last-child>span{border-bottom-right-radius:6px;border-top-right-radius:6px}.pagination-sm>li>a,.pagination-sm>li>span{padding:6px 9px;font-size:13px}.pagination-sm>li:first-child>a,.pagination-sm>li:first-child>span{border-bottom-left-radius:3px;border-top-left-radius:3px}.pagination-sm>li:last-child>a,.pagination-sm>li:last-child>span{border-bottom-right-radius:3px;border-top-right-radius:3px}.pager{padding-left:0;margin:21px 0;list-style:none;text-align:center}.pager li{display:inline}.pager li>a,.pager li>span{display:inline-block;padding:5px 14px;background-color:#18bc9c;border:1px solid transparent;border-radius:15px}.pager li>a:hover,.pager li>a:focus{text-decoration:none;background-color:#0f7864}.pager .next>a,.pager .next>span{float:right}.pager .previous>a,.pager .previous>span{float:left}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{color:#ffffff;background-color:#18bc9c;cursor:not-allowed}.label{display:inline;padding:.2em .6em .3em;font-size:75%;font-weight:bold;line-height:1;color:#ffffff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25em}a.label:hover,a.label:focus{color:#ffffff;text-decoration:none;cursor:pointer}.label:empty{display:none}.btn .label{position:relative;top:-1px}.label-default{background-color:#95a5a6}.label-default[href]:hover,.label-default[href]:focus{background-color:#798d8f}.label-primary{background-color:#2c3e50}.label-primary[href]:hover,.label-primary[href]:focus{background-color:#1a242f}.label-success{background-color:#18bc9c}.label-success[href]:hover,.label-success[href]:focus{background-color:#128f76}.label-info{background-color:#3498db}.label-info[href]:hover,.label-info[href]:focus{background-color:#217dbb}.label-warning{background-color:#f39c12}.label-warning[href]:hover,.label-warning[href]:focus{background-color:#c87f0a}.label-danger{background-color:#e74c3c}.label-danger[href]:hover,.label-danger[href]:focus{background-color:#d62c1a}.badge{display:inline-block;min-width:10px;padding:3px 7px;font-size:13px;font-weight:bold;color:#ffffff;line-height:1;vertical-align:baseline;white-space:nowrap;text-align:center;background-color:#2c3e50;border-radius:10px}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.btn-xs .badge{top:0;padding:1px 5px}a.badge:hover,a.badge:focus{color:#ffffff;text-decoration:none;cursor:pointer}.list-group-item.active>.badge,.nav-pills>.active>a>.badge{color:#2c3e50;background-color:#ffffff}.list-group-item>.badge{float:right}.list-group-item>.badge+.badge{margin-right:5px}.nav-pills>li>a>.badge{margin-left:3px}.jumbotron{padding:30px 15px;margin-bottom:30px;color:inherit;background-color:#ecf0f1}.jumbotron h1,.jumbotron .h1{color:inherit}.jumbotron p{margin-bottom:15px;font-size:23px;font-weight:200}.jumbotron>hr{border-top-color:#cfd9db}.container .jumbotron,.container-fluid .jumbotron{border-radius:6px}.jumbotron .container{max-width:100%}@media screen and (min-width:768px){.jumbotron{padding:48px 0}.container .jumbotron,.container-fluid .jumbotron{padding-left:60px;padding-right:60px}.jumbotron h1,.jumbotron .h1{font-size:67.5px}}.thumbnail{display:block;padding:4px;margin-bottom:21px;line-height:1.42857143;background-color:#ffffff;border:1px solid #ecf0f1;border-radius:4px;-webkit-transition:border .2s ease-in-out;-o-transition:border .2s ease-in-out;transition:border .2s ease-in-out}.thumbnail>img,.thumbnail a>img{margin-left:auto;margin-right:auto}a.thumbnail:hover,a.thumbnail:focus,a.thumbnail.active{border-color:#18bc9c}.thumbnail .caption{padding:9px;color:#2c3e50}.alert{padding:15px;margin-bottom:21px;border:1px solid transparent;border-radius:4px}.alert h4{margin-top:0;color:inherit}.alert .alert-link{font-weight:bold}.alert>p,.alert>ul{margin-bottom:0}.alert>p+p{margin-top:5px}.alert-dismissable,.alert-dismissible{padding-right:35px}.alert-dismissable .close,.alert-dismissible .close{position:relative;top:-2px;right:-21px;color:inherit}.alert-success{background-color:#18bc9c;border-color:#18bc9c;color:#ffffff}.alert-success hr{border-top-color:#15a589}.alert-success .alert-link{color:#e6e6e6}.alert-info{background-color:#3498db;border-color:#3498db;color:#ffffff}.alert-info hr{border-top-color:#258cd1}.alert-info .alert-link{color:#e6e6e6}.alert-warning{background-color:#f39c12;border-color:#f39c12;color:#ffffff}.alert-warning hr{border-top-color:#e08e0b}.alert-warning .alert-link{color:#e6e6e6}.alert-danger{background-color:#e74c3c;border-color:#e74c3c;color:#ffffff}.alert-danger hr{border-top-color:#e43725}.alert-danger .alert-link{color:#e6e6e6}@-webkit-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@-o-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}.progress{overflow:hidden;height:21px;margin-bottom:21px;background-color:#ecf0f1;border-radius:4px;-webkit-box-shadow:inset 0 1px 2px rgba(0,0,0,0.1);box-shadow:inset 0 1px 2px rgba(0,0,0,0.1)}.progress-bar{float:left;width:0%;height:100%;font-size:13px;line-height:21px;color:#ffffff;text-align:center;background-color:#2c3e50;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);-webkit-transition:width 0.6s ease;-o-transition:width 0.6s ease;transition:width 0.6s ease}.progress-striped .progress-bar,.progress-bar-striped{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);-webkit-background-size:40px 40px;background-size:40px 40px}.progress.active .progress-bar,.progress-bar.active{-webkit-animation:progress-bar-stripes 2s linear infinite;-o-animation:progress-bar-stripes 2s linear infinite;animation:progress-bar-stripes 2s linear infinite}.progress-bar-success{background-color:#18bc9c}.progress-striped .progress-bar-success{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-info{background-color:#3498db}.progress-striped .progress-bar-info{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-warning{background-color:#f39c12}.progress-striped .progress-bar-warning{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-danger{background-color:#e74c3c}.progress-striped .progress-bar-danger{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.media{margin-top:15px}.media:first-child{margin-top:0}.media-right,.media>.pull-right{padding-left:10px}.media-left,.media>.pull-left{padding-right:10px}.media-left,.media-right,.media-body{display:table-cell;vertical-align:top}.media-middle{vertical-align:middle}.media-bottom{vertical-align:bottom}.media-heading{margin-top:0;margin-bottom:5px}.media-list{padding-left:0;list-style:none}.list-group{margin-bottom:20px;padding-left:0}.list-group-item{position:relative;display:block;padding:10px 15px;margin-bottom:-1px;background-color:#ffffff;border:1px solid #ecf0f1}.list-group-item:first-child{border-top-right-radius:4px;border-top-left-radius:4px}.list-group-item:last-child{margin-bottom:0;border-bottom-right-radius:4px;border-bottom-left-radius:4px}a.list-group-item{color:#555555}a.list-group-item .list-group-item-heading{color:#333333}a.list-group-item:hover,a.list-group-item:focus{text-decoration:none;color:#555555;background-color:#ecf0f1}.list-group-item.disabled,.list-group-item.disabled:hover,.list-group-item.disabled:focus{background-color:#ecf0f1;color:#b4bcc2;cursor:not-allowed}.list-group-item.disabled .list-group-item-heading,.list-group-item.disabled:hover .list-group-item-heading,.list-group-item.disabled:focus .list-group-item-heading{color:inherit}.list-group-item.disabled .list-group-item-text,.list-group-item.disabled:hover .list-group-item-text,.list-group-item.disabled:focus .list-group-item-text{color:#b4bcc2}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{z-index:2;color:#ffffff;background-color:#2c3e50;border-color:#2c3e50}.list-group-item.active .list-group-item-heading,.list-group-item.active:hover .list-group-item-heading,.list-group-item.active:focus .list-group-item-heading,.list-group-item.active .list-group-item-heading>small,.list-group-item.active:hover .list-group-item-heading>small,.list-group-item.active:focus .list-group-item-heading>small,.list-group-item.active .list-group-item-heading>.small,.list-group-item.active:hover .list-group-item-heading>.small,.list-group-item.active:focus .list-group-item-heading>.small{color:inherit}.list-group-item.active .list-group-item-text,.list-group-item.active:hover .list-group-item-text,.list-group-item.active:focus .list-group-item-text{color:#8aa4be}.list-group-item-success{color:#ffffff;background-color:#18bc9c}a.list-group-item-success{color:#ffffff}a.list-group-item-success .list-group-item-heading{color:inherit}a.list-group-item-success:hover,a.list-group-item-success:focus{color:#ffffff;background-color:#15a589}a.list-group-item-success.active,a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{color:#fff;background-color:#ffffff;border-color:#ffffff}.list-group-item-info{color:#ffffff;background-color:#3498db}a.list-group-item-info{color:#ffffff}a.list-group-item-info .list-group-item-heading{color:inherit}a.list-group-item-info:hover,a.list-group-item-info:focus{color:#ffffff;background-color:#258cd1}a.list-group-item-info.active,a.list-group-item-info.active:hover,a.list-group-item-info.active:focus{color:#fff;background-color:#ffffff;border-color:#ffffff}.list-group-item-warning{color:#ffffff;background-color:#f39c12}a.list-group-item-warning{color:#ffffff}a.list-group-item-warning .list-group-item-heading{color:inherit}a.list-group-item-warning:hover,a.list-group-item-warning:focus{color:#ffffff;background-color:#e08e0b}a.list-group-item-warning.active,a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{color:#fff;background-color:#ffffff;border-color:#ffffff}.list-group-item-danger{color:#ffffff;background-color:#e74c3c}a.list-group-item-danger{color:#ffffff}a.list-group-item-danger .list-group-item-heading{color:inherit}a.list-group-item-danger:hover,a.list-group-item-danger:focus{color:#ffffff;background-color:#e43725}a.list-group-item-danger.active,a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{color:#fff;background-color:#ffffff;border-color:#ffffff}.list-group-item-heading{margin-top:0;margin-bottom:5px}.list-group-item-text{margin-bottom:0;line-height:1.3}.panel{margin-bottom:21px;background-color:#ffffff;border:1px solid transparent;border-radius:4px;-webkit-box-shadow:0 1px 1px rgba(0,0,0,0.05);box-shadow:0 1px 1px rgba(0,0,0,0.05)}.panel-body{padding:15px}.panel-heading{padding:10px 15px;border-bottom:1px solid transparent;border-top-right-radius:3px;border-top-left-radius:3px}.panel-heading>.dropdown .dropdown-toggle{color:inherit}.panel-title{margin-top:0;margin-bottom:0;font-size:17px;color:inherit}.panel-title>a{color:inherit}.panel-footer{padding:10px 15px;background-color:#ecf0f1;border-top:1px solid #ecf0f1;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.list-group,.panel>.panel-collapse>.list-group{margin-bottom:0}.panel>.list-group .list-group-item,.panel>.panel-collapse>.list-group .list-group-item{border-width:1px 0;border-radius:0}.panel>.list-group:first-child .list-group-item:first-child,.panel>.panel-collapse>.list-group:first-child .list-group-item:first-child{border-top:0;border-top-right-radius:3px;border-top-left-radius:3px}.panel>.list-group:last-child .list-group-item:last-child,.panel>.panel-collapse>.list-group:last-child .list-group-item:last-child{border-bottom:0;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel-heading+.list-group .list-group-item:first-child{border-top-width:0}.list-group+.panel-footer{border-top-width:0}.panel>.table,.panel>.table-responsive>.table,.panel>.panel-collapse>.table{margin-bottom:0}.panel>.table caption,.panel>.table-responsive>.table caption,.panel>.panel-collapse>.table caption{padding-left:15px;padding-right:15px}.panel>.table:first-child,.panel>.table-responsive:first-child>.table:first-child{border-top-right-radius:3px;border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child{border-top-left-radius:3px;border-top-right-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:first-child{border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:last-child{border-top-right-radius:3px}.panel>.table:last-child,.panel>.table-responsive:last-child>.table:last-child{border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child{border-bottom-left-radius:3px;border-bottom-right-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:first-child{border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:last-child{border-bottom-right-radius:3px}.panel>.panel-body+.table,.panel>.panel-body+.table-responsive,.panel>.table+.panel-body,.panel>.table-responsive+.panel-body{border-top:1px solid #ecf0f1}.panel>.table>tbody:first-child>tr:first-child th,.panel>.table>tbody:first-child>tr:first-child td{border-top:0}.panel>.table-bordered,.panel>.table-responsive>.table-bordered{border:0}.panel>.table-bordered>thead>tr>th:first-child,.panel>.table-responsive>.table-bordered>thead>tr>th:first-child,.panel>.table-bordered>tbody>tr>th:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:first-child,.panel>.table-bordered>tfoot>tr>th:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:first-child,.panel>.table-bordered>thead>tr>td:first-child,.panel>.table-responsive>.table-bordered>thead>tr>td:first-child,.panel>.table-bordered>tbody>tr>td:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:first-child,.panel>.table-bordered>tfoot>tr>td:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.panel>.table-bordered>thead>tr>th:last-child,.panel>.table-responsive>.table-bordered>thead>tr>th:last-child,.panel>.table-bordered>tbody>tr>th:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:last-child,.panel>.table-bordered>tfoot>tr>th:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:last-child,.panel>.table-bordered>thead>tr>td:last-child,.panel>.table-responsive>.table-bordered>thead>tr>td:last-child,.panel>.table-bordered>tbody>tr>td:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:last-child,.panel>.table-bordered>tfoot>tr>td:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.panel>.table-bordered>thead>tr:first-child>td,.panel>.table-responsive>.table-bordered>thead>tr:first-child>td,.panel>.table-bordered>tbody>tr:first-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>td,.panel>.table-bordered>thead>tr:first-child>th,.panel>.table-responsive>.table-bordered>thead>tr:first-child>th,.panel>.table-bordered>tbody>tr:first-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>th{border-bottom:0}.panel>.table-bordered>tbody>tr:last-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>td,.panel>.table-bordered>tfoot>tr:last-child>td,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>td,.panel>.table-bordered>tbody>tr:last-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>th,.panel>.table-bordered>tfoot>tr:last-child>th,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>th{border-bottom:0}.panel>.table-responsive{border:0;margin-bottom:0}.panel-group{margin-bottom:21px}.panel-group .panel{margin-bottom:0;border-radius:4px}.panel-group .panel+.panel{margin-top:5px}.panel-group .panel-heading{border-bottom:0}.panel-group .panel-heading+.panel-collapse>.panel-body,.panel-group .panel-heading+.panel-collapse>.list-group{border-top:1px solid #ecf0f1}.panel-group .panel-footer{border-top:0}.panel-group .panel-footer+.panel-collapse .panel-body{border-bottom:1px solid #ecf0f1}.panel-default{border-color:#ecf0f1}.panel-default>.panel-heading{color:#2c3e50;background-color:#ecf0f1;border-color:#ecf0f1}.panel-default>.panel-heading+.panel-collapse>.panel-body{border-top-color:#ecf0f1}.panel-default>.panel-heading .badge{color:#ecf0f1;background-color:#2c3e50}.panel-default>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#ecf0f1}.panel-primary{border-color:#2c3e50}.panel-primary>.panel-heading{color:#ffffff;background-color:#2c3e50;border-color:#2c3e50}.panel-primary>.panel-heading+.panel-collapse>.panel-body{border-top-color:#2c3e50}.panel-primary>.panel-heading .badge{color:#2c3e50;background-color:#ffffff}.panel-primary>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#2c3e50}.panel-success{border-color:#18bc9c}.panel-success>.panel-heading{color:#ffffff;background-color:#18bc9c;border-color:#18bc9c}.panel-success>.panel-heading+.panel-collapse>.panel-body{border-top-color:#18bc9c}.panel-success>.panel-heading .badge{color:#18bc9c;background-color:#ffffff}.panel-success>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#18bc9c}.panel-info{border-color:#3498db}.panel-info>.panel-heading{color:#ffffff;background-color:#3498db;border-color:#3498db}.panel-info>.panel-heading+.panel-collapse>.panel-body{border-top-color:#3498db}.panel-info>.panel-heading .badge{color:#3498db;background-color:#ffffff}.panel-info>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#3498db}.panel-warning{border-color:#f39c12}.panel-warning>.panel-heading{color:#ffffff;background-color:#f39c12;border-color:#f39c12}.panel-warning>.panel-heading+.panel-collapse>.panel-body{border-top-color:#f39c12}.panel-warning>.panel-heading .badge{color:#f39c12;background-color:#ffffff}.panel-warning>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#f39c12}.panel-danger{border-color:#e74c3c}.panel-danger>.panel-heading{color:#ffffff;background-color:#e74c3c;border-color:#e74c3c}.panel-danger>.panel-heading+.panel-collapse>.panel-body{border-top-color:#e74c3c}.panel-danger>.panel-heading .badge{color:#e74c3c;background-color:#ffffff}.panel-danger>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#e74c3c}.embed-responsive{position:relative;display:block;height:0;padding:0;overflow:hidden}.embed-responsive .embed-responsive-item,.embed-responsive iframe,.embed-responsive embed,.embed-responsive object,.embed-responsive video{position:absolute;top:0;left:0;bottom:0;height:100%;width:100%;border:0}.embed-responsive.embed-responsive-16by9{padding-bottom:56.25%}.embed-responsive.embed-responsive-4by3{padding-bottom:75%}.well{min-height:20px;padding:19px;margin-bottom:20px;background-color:#ecf0f1;border:1px solid transparent;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.05);box-shadow:inset 0 1px 1px rgba(0,0,0,0.05)}.well blockquote{border-color:#ddd;border-color:rgba(0,0,0,0.15)}.well-lg{padding:24px;border-radius:6px}.well-sm{padding:9px;border-radius:3px}.close{float:right;font-size:22.5px;font-weight:bold;line-height:1;color:#000000;text-shadow:none;opacity:0.2;filter:alpha(opacity=20)}.close:hover,.close:focus{color:#000000;text-decoration:none;cursor:pointer;opacity:0.5;filter:alpha(opacity=50)}button.close{padding:0;cursor:pointer;background:transparent;border:0;-webkit-appearance:none}.modal-open{overflow:hidden}.modal{display:none;overflow:hidden;position:fixed;top:0;right:0;bottom:0;left:0;z-index:1040;-webkit-overflow-scrolling:touch;outline:0}.modal.fade .modal-dialog{-webkit-transform:translate(0, -25%);-ms-transform:translate(0, -25%);-o-transform:translate(0, -25%);transform:translate(0, -25%);-webkit-transition:-webkit-transform .3s ease-out;-o-transition:-o-transform .3s ease-out;transition:transform .3s ease-out}.modal.in .modal-dialog{-webkit-transform:translate(0, 0);-ms-transform:translate(0, 0);-o-transform:translate(0, 0);transform:translate(0, 0)}.modal-open .modal{overflow-x:hidden;overflow-y:auto}.modal-dialog{position:relative;width:auto;margin:10px}.modal-content{position:relative;background-color:#ffffff;border:1px solid #999999;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 3px 9px rgba(0,0,0,0.5);box-shadow:0 3px 9px rgba(0,0,0,0.5);-webkit-background-clip:padding-box;background-clip:padding-box;outline:0}.modal-backdrop{position:absolute;top:0;right:0;left:0;background-color:#000000}.modal-backdrop.fade{opacity:0;filter:alpha(opacity=0)}.modal-backdrop.in{opacity:0.5;filter:alpha(opacity=50)}.modal-header{padding:15px;border-bottom:1px solid #e5e5e5;min-height:16.42857143px}.modal-header .close{margin-top:-2px}.modal-title{margin:0;line-height:1.42857143}.modal-body{position:relative;padding:20px}.modal-footer{padding:20px;text-align:right;border-top:1px solid #e5e5e5}.modal-footer .btn+.btn{margin-left:5px;margin-bottom:0}.modal-footer .btn-group .btn+.btn{margin-left:-1px}.modal-footer .btn-block+.btn-block{margin-left:0}.modal-scrollbar-measure{position:absolute;top:-9999px;width:50px;height:50px;overflow:scroll}@media (min-width:768px){.modal-dialog{width:600px;margin:30px auto}.modal-content{-webkit-box-shadow:0 5px 15px rgba(0,0,0,0.5);box-shadow:0 5px 15px rgba(0,0,0,0.5)}.modal-sm{width:300px}}@media (min-width:992px){.modal-lg{width:900px}}.tooltip{position:absolute;z-index:1070;display:block;visibility:visible;font-family:"Lato","Helvetica Neue",Helvetica,Arial,sans-serif;font-size:13px;font-weight:normal;line-height:1.4;opacity:0;filter:alpha(opacity=0)}.tooltip.in{opacity:0.9;filter:alpha(opacity=90)}.tooltip.top{margin-top:-3px;padding:5px 0}.tooltip.right{margin-left:3px;padding:0 5px}.tooltip.bottom{margin-top:3px;padding:5px 0}.tooltip.left{margin-left:-3px;padding:0 5px}.tooltip-inner{max-width:200px;padding:3px 8px;color:#ffffff;text-align:center;text-decoration:none;background-color:rgba(0,0,0,0.9);border-radius:4px}.tooltip-arrow{position:absolute;width:0;height:0;border-color:transparent;border-style:solid}.tooltip.top .tooltip-arrow{bottom:0;left:50%;margin-left:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-left .tooltip-arrow{bottom:0;right:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-right .tooltip-arrow{bottom:0;left:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.right .tooltip-arrow{top:50%;left:0;margin-top:-5px;border-width:5px 5px 5px 0;border-right-color:rgba(0,0,0,0.9)}.tooltip.left .tooltip-arrow{top:50%;right:0;margin-top:-5px;border-width:5px 0 5px 5px;border-left-color:rgba(0,0,0,0.9)}.tooltip.bottom .tooltip-arrow{top:0;left:50%;margin-left:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-left .tooltip-arrow{top:0;right:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-right .tooltip-arrow{top:0;left:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.popover{position:absolute;top:0;left:0;z-index:1060;display:none;max-width:276px;padding:1px;font-family:"Lato","Helvetica Neue",Helvetica,Arial,sans-serif;font-size:15px;font-weight:normal;line-height:1.42857143;text-align:left;background-color:#ffffff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 5px 10px rgba(0,0,0,0.2);box-shadow:0 5px 10px rgba(0,0,0,0.2);white-space:normal}.popover.top{margin-top:-10px}.popover.right{margin-left:10px}.popover.bottom{margin-top:10px}.popover.left{margin-left:-10px}.popover-title{margin:0;padding:8px 14px;font-size:15px;background-color:#f7f7f7;border-bottom:1px solid #ebebeb;border-radius:5px 5px 0 0}.popover-content{padding:9px 14px}.popover>.arrow,.popover>.arrow:after{position:absolute;display:block;width:0;height:0;border-color:transparent;border-style:solid}.popover>.arrow{border-width:11px}.popover>.arrow:after{border-width:10px;content:""}.popover.top>.arrow{left:50%;margin-left:-11px;border-bottom-width:0;border-top-color:#999999;border-top-color:rgba(0,0,0,0.25);bottom:-11px}.popover.top>.arrow:after{content:" ";bottom:1px;margin-left:-10px;border-bottom-width:0;border-top-color:#ffffff}.popover.right>.arrow{top:50%;left:-11px;margin-top:-11px;border-left-width:0;border-right-color:#999999;border-right-color:rgba(0,0,0,0.25)}.popover.right>.arrow:after{content:" ";left:1px;bottom:-10px;border-left-width:0;border-right-color:#ffffff}.popover.bottom>.arrow{left:50%;margin-left:-11px;border-top-width:0;border-bottom-color:#999999;border-bottom-color:rgba(0,0,0,0.25);top:-11px}.popover.bottom>.arrow:after{content:" ";top:1px;margin-left:-10px;border-top-width:0;border-bottom-color:#ffffff}.popover.left>.arrow{top:50%;right:-11px;margin-top:-11px;border-right-width:0;border-left-color:#999999;border-left-color:rgba(0,0,0,0.25)}.popover.left>.arrow:after{content:" ";right:1px;border-right-width:0;border-left-color:#ffffff;bottom:-10px}.carousel{position:relative}.carousel-inner{position:relative;overflow:hidden;width:100%}.carousel-inner>.item{display:none;position:relative;-webkit-transition:.6s ease-in-out left;-o-transition:.6s ease-in-out left;transition:.6s ease-in-out left}.carousel-inner>.item>img,.carousel-inner>.item>a>img{line-height:1}@media all and (transform-3d),(-webkit-transform-3d){.carousel-inner>.item{-webkit-transition:-webkit-transform .6s ease-in-out;-o-transition:-o-transform .6s ease-in-out;transition:transform .6s ease-in-out;-webkit-backface-visibility:hidden;backface-visibility:hidden;-webkit-perspective:1000;perspective:1000}.carousel-inner>.item.next,.carousel-inner>.item.active.right{-webkit-transform:translate3d(100%, 0, 0);transform:translate3d(100%, 0, 0);left:0}.carousel-inner>.item.prev,.carousel-inner>.item.active.left{-webkit-transform:translate3d(-100%, 0, 0);transform:translate3d(-100%, 0, 0);left:0}.carousel-inner>.item.next.left,.carousel-inner>.item.prev.right,.carousel-inner>.item.active{-webkit-transform:translate3d(0, 0, 0);transform:translate3d(0, 0, 0);left:0}}.carousel-inner>.active,.carousel-inner>.next,.carousel-inner>.prev{display:block}.carousel-inner>.active{left:0}.carousel-inner>.next,.carousel-inner>.prev{position:absolute;top:0;width:100%}.carousel-inner>.next{left:100%}.carousel-inner>.prev{left:-100%}.carousel-inner>.next.left,.carousel-inner>.prev.right{left:0}.carousel-inner>.active.left{left:-100%}.carousel-inner>.active.right{left:100%}.carousel-control{position:absolute;top:0;left:0;bottom:0;width:15%;opacity:0.5;filter:alpha(opacity=50);font-size:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-control.left{background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.5)), to(rgba(0,0,0,0.0001)));background-image:linear-gradient(to right, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1)}.carousel-control.right{left:auto;right:0;background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.0001)), to(rgba(0,0,0,0.5)));background-image:linear-gradient(to right, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1)}.carousel-control:hover,.carousel-control:focus{outline:0;color:#ffffff;text-decoration:none;opacity:0.9;filter:alpha(opacity=90)}.carousel-control .icon-prev,.carousel-control .icon-next,.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right{position:absolute;top:50%;z-index:5;display:inline-block}.carousel-control .icon-prev,.carousel-control .glyphicon-chevron-left{left:50%;margin-left:-10px}.carousel-control .icon-next,.carousel-control .glyphicon-chevron-right{right:50%;margin-right:-10px}.carousel-control .icon-prev,.carousel-control .icon-next{width:20px;height:20px;margin-top:-10px;font-family:serif}.carousel-control .icon-prev:before{content:'\2039'}.carousel-control .icon-next:before{content:'\203a'}.carousel-indicators{position:absolute;bottom:10px;left:50%;z-index:15;width:60%;margin-left:-30%;padding-left:0;list-style:none;text-align:center}.carousel-indicators li{display:inline-block;width:10px;height:10px;margin:1px;text-indent:-999px;border:1px solid #ffffff;border-radius:10px;cursor:pointer;background-color:#000 \9;background-color:rgba(0,0,0,0)}.carousel-indicators .active{margin:0;width:12px;height:12px;background-color:#ffffff}.carousel-caption{position:absolute;left:15%;right:15%;bottom:20px;z-index:10;padding-top:20px;padding-bottom:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-caption .btn{text-shadow:none}@media screen and (min-width:768px){.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right,.carousel-control .icon-prev,.carousel-control .icon-next{width:30px;height:30px;margin-top:-15px;font-size:30px}.carousel-control .glyphicon-chevron-left,.carousel-control .icon-prev{margin-left:-15px}.carousel-control .glyphicon-chevron-right,.carousel-control .icon-next{margin-right:-15px}.carousel-caption{left:20%;right:20%;padding-bottom:30px}.carousel-indicators{bottom:20px}}.clearfix:before,.clearfix:after,.dl-horizontal dd:before,.dl-horizontal dd:after,.container:before,.container:after,.container-fluid:before,.container-fluid:after,.row:before,.row:after,.form-horizontal .form-group:before,.form-horizontal .form-group:after,.btn-toolbar:before,.btn-toolbar:after,.btn-group-vertical>.btn-group:before,.btn-group-vertical>.btn-group:after,.nav:before,.nav:after,.navbar:before,.navbar:after,.navbar-header:before,.navbar-header:after,.navbar-collapse:before,.navbar-collapse:after,.pager:before,.pager:after,.panel-body:before,.panel-body:after,.modal-footer:before,.modal-footer:after{content:" ";display:table}.clearfix:after,.dl-horizontal dd:after,.container:after,.container-fluid:after,.row:after,.form-horizontal .form-group:after,.btn-toolbar:after,.btn-group-vertical>.btn-group:after,.nav:after,.navbar:after,.navbar-header:after,.navbar-collapse:after,.pager:after,.panel-body:after,.modal-footer:after{clear:both}.center-block{display:block;margin-left:auto;margin-right:auto}.pull-right{float:right !important}.pull-left{float:left !important}.hide{display:none !important}.show{display:block !important}.invisible{visibility:hidden}.text-hide{font:0/0 a;color:transparent;text-shadow:none;background-color:transparent;border:0}.hidden{display:none !important;visibility:hidden !important}.affix{position:fixed}@-ms-viewport{width:device-width}.visible-xs,.visible-sm,.visible-md,.visible-lg{display:none !important}.visible-xs-block,.visible-xs-inline,.visible-xs-inline-block,.visible-sm-block,.visible-sm-inline,.visible-sm-inline-block,.visible-md-block,.visible-md-inline,.visible-md-inline-block,.visible-lg-block,.visible-lg-inline,.visible-lg-inline-block{display:none !important}@media (max-width:767px){.visible-xs{display:block !important}table.visible-xs{display:table}tr.visible-xs{display:table-row !important}th.visible-xs,td.visible-xs{display:table-cell !important}}@media (max-width:767px){.visible-xs-block{display:block !important}}@media (max-width:767px){.visible-xs-inline{display:inline !important}}@media (max-width:767px){.visible-xs-inline-block{display:inline-block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm{display:block !important}table.visible-sm{display:table}tr.visible-sm{display:table-row !important}th.visible-sm,td.visible-sm{display:table-cell !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-block{display:block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline{display:inline !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline-block{display:inline-block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md{display:block !important}table.visible-md{display:table}tr.visible-md{display:table-row !important}th.visible-md,td.visible-md{display:table-cell !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-block{display:block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline{display:inline !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline-block{display:inline-block !important}}@media (min-width:1200px){.visible-lg{display:block !important}table.visible-lg{display:table}tr.visible-lg{display:table-row !important}th.visible-lg,td.visible-lg{display:table-cell !important}}@media (min-width:1200px){.visible-lg-block{display:block !important}}@media (min-width:1200px){.visible-lg-inline{display:inline !important}}@media (min-width:1200px){.visible-lg-inline-block{display:inline-block !important}}@media (max-width:767px){.hidden-xs{display:none !important}}@media (min-width:768px) and (max-width:991px){.hidden-sm{display:none !important}}@media (min-width:992px) and (max-width:1199px){.hidden-md{display:none !important}}@media (min-width:1200px){.hidden-lg{display:none !important}}.visible-print{display:none !important}@media print{.visible-print{display:block !important}table.visible-print{display:table}tr.visible-print{display:table-row !important}th.visible-print,td.visible-print{display:table-cell !important}}.visible-print-block{display:none !important}@media print{.visible-print-block{display:block !important}}.visible-print-inline{display:none !important}@media print{.visible-print-inline{display:inline !important}}.visible-print-inline-block{display:none !important}@media print{.visible-print-inline-block{display:inline-block !important}}@media print{.hidden-print{display:none !important}}.navbar{border-width:0}.navbar-default .badge{background-color:#fff;color:#2c3e50}.navbar-inverse .badge{background-color:#fff;color:#18bc9c}.navbar-brand{padding:18.5px 15px 20.5px}.btn:active{-webkit-box-shadow:none;box-shadow:none}.btn-group.open .dropdown-toggle{-webkit-box-shadow:none;box-shadow:none}.text-primary,.text-primary:hover{color:#2c3e50}.text-success,.text-success:hover{color:#18bc9c}.text-danger,.text-danger:hover{color:#e74c3c}.text-warning,.text-warning:hover{color:#f39c12}.text-info,.text-info:hover{color:#3498db}table a:not(.btn),.table a:not(.btn){text-decoration:underline}table .dropdown-menu a,.table .dropdown-menu a{text-decoration:none}table .success,.table .success,table .warning,.table .warning,table .danger,.table .danger,table .info,.table .info{color:#fff}table .success a,.table .success a,table .warning a,.table .warning a,table .danger a,.table .danger a,table .info a,.table .info a{color:#fff}table>thead>tr>th,.table>thead>tr>th,table>tbody>tr>th,.table>tbody>tr>th,table>tfoot>tr>th,.table>tfoot>tr>th,table>thead>tr>td,.table>thead>tr>td,table>tbody>tr>td,.table>tbody>tr>td,table>tfoot>tr>td,.table>tfoot>tr>td{border:none}table-bordered>thead>tr>th,.table-bordered>thead>tr>th,table-bordered>tbody>tr>th,.table-bordered>tbody>tr>th,table-bordered>tfoot>tr>th,.table-bordered>tfoot>tr>th,table-bordered>thead>tr>td,.table-bordered>thead>tr>td,table-bordered>tbody>tr>td,.table-bordered>tbody>tr>td,table-bordered>tfoot>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #ecf0f1}.form-control,input{border-width:2px;-webkit-box-shadow:none;box-shadow:none}.form-control:focus,input:focus{-webkit-box-shadow:none;box-shadow:none}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning .form-control-feedback{color:#f39c12}.has-warning .form-control,.has-warning .form-control:focus{border:2px solid #f39c12}.has-warning .input-group-addon{border-color:#f39c12}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error .form-control-feedback{color:#e74c3c}.has-error .form-control,.has-error .form-control:focus{border:2px solid #e74c3c}.has-error .input-group-addon{border-color:#e74c3c}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success .form-control-feedback{color:#18bc9c}.has-success .form-control,.has-success .form-control:focus{border:2px solid #18bc9c}.has-success .input-group-addon{border-color:#18bc9c}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{border-color:transparent}.pager a,.pager a:hover{color:#fff}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{background-color:#3be6c4}.close{color:#fff;text-decoration:none;opacity:0.4}.close:hover,.close:focus{color:#fff;opacity:1}.alert .alert-link{color:#fff;text-decoration:underline}.progress{height:10px;-webkit-box-shadow:none;box-shadow:none}.progress .progress-bar{font-size:10px;line-height:10px}.well{-webkit-box-shadow:none;box-shadow:none}a.list-group-item.active,a.list-group-item.active:hover,a.list-group-item.active:focus{border-color:#ecf0f1}a.list-group-item-success.active{background-color:#18bc9c}a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{background-color:#15a589}a.list-group-item-warning.active{background-color:#f39c12}a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{background-color:#e08e0b}a.list-group-item-danger.active{background-color:#e74c3c}a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{background-color:#e43725}.panel-default .close{color:#2c3e50}.modal .close{color:#2c3e50}.popover{color:#2c3e50} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/css/fonts/Lato.ttf b/www/bootstrap-3.3.1/css/fonts/Lato.ttf deleted file mode 100644 index 7608bc3e0fd03fc3cf3a41501ed9c1b49b773ac4..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 81980 zcmc${2Yg)Bl?VLpd-JAfil&c7Wk#csM!n69dK*cWEK9Q0T;$&5Ua^faHXQ>FU{ez? z0aF8k5W)f}luZHz*krT22`S$OHkI^bL&_#0SQ>x-bKiTTkt`d-?)UpJ_RPF@@44;t zbMCzY69mD5e{_O<{_xP)R}Q|hQ(%=>34*hK{@9YP6OAVh3#{XtD7ANJtUCIGr=Hj* z2;V5d?{yn@t>1fd)~)#Zjbr%dxs3-8;Q^{^nkxfj2yHt*fCYu}1}2|@VRRzcAJ zV$1sddj+SE1^5T>-m+!qrJKK+>3c^ISgs(vx^C;H^%Il#{y8iNudl-U`mK17`31wp zfUm>v!mYaw9NJg6=zhGvQxK%xJ2vgx-OgVrXziU%&apOG#EBzAQAKJTT|AD1Hx7G`+yhaej&b|9K?S0hn zaUb9nqWl2nq!R6%mQM;rLY>egv9xb- ziEe?30t*O|$V7=n1*Q|34!{Lb5=16M08%#UWcp?@=`kijuQvw;qtQU$4F-!L-;^`( z^iF{4oEwy0FbR5-0046VO##X@<(w~%T1@~0ciUF}jV8W25h zn=X@uizDs2x_Bg9U=zay#jbe0`VPM$EaV6^;P3nXrg=kE9a|QZ1}f`o!aB!ci!Qse zp(cMpQ)y#KuGw$d*k0o;$#XdJO1w4g$p@u>pNvMOjg$B3F7`(99O1;u#)jdR@<@?y z+r-0{Zu1+`tr9NLtz|o<5vF~8btU^e*B4HDR zK(5<~Usi)&*48NpC4uyXI>s30U&LZz{w2vN_v0PF5q(6a3wWe_DJM}dKvGx7$;jP<^w>gzm3RsD8-YuOJufjMp1ds5^gwt#m1hdENab)62 zhF+&njn!>2F`d9zfCfXOmL;8paSIsAz|+45t`(<>@K?N4SSf`Hg{Vh=Lb{wpB`=8~ z1~3H@K?}?H6ba*n2u&wdAOI*YtCL``F`z^>bA%kJuPkPla)a43E+NLXQBhY+8gWZVl~xeCB>1VaDE^s+n?pMXIe8% z5_4$due4c2o!u&7S#;=c#Ka5+b1>5^$}&-4hEde(Z9$qFi;yp?t6z>%dPAIEQc0a& z7R1ObKvX4D;0QyL*r-(DlT~+iMTRvH!UTePQOG+)-$MGF#5%!XGQ(K43QEN7S*zUc+t8z804%7EQr!D44t$zmlu)d>>A+R{rKwIVS32w9dZ zDf-ecuCQcd<;|ilhxS^f3FczzO92T2K+FVcl`|HnC+!k*Qw^KM{(R{heRYOxo2#aG{k)>y z8+LRy?RsEqhM4W`vTeJ&wcMR;D{UUE4fWl;x2JXgV>>Kjj;D*=U6fc_ThO_wCp`7N zg4W^cKYc6?%l_ zY*oU$bn#$+SE8}Lwz{IMupm3jZc`U^E$w^i32AQ;6L;f{^4i zk$NV}78y%3@N@y{#XqdWQ)8 z1BwT}qQ`TMLY6brI^dxWBzjVHWw0Yz|3NTN#6)Hc}$7cZ&3DYv$>sHn3hC#Qx!Yjee` zta({io&HTmuIs2=7hkr2y7+;mH8;*KuIpHQ-O8GpmDep^di|=JnpM{??ON56o!zpk zt8-(33qnf`4uR8{5F_qG%qCJ?1&O7gix0TMWt5E> z7}q99sZda>p^6cP5f6$*>l=Vj;+;d+tZmTkk#$y|YzWr&R7HoIf{udv2)j2@X%yYg z-C}PSt9UZ6(0l8ezuqx?&!zprAeBW;x&=w0MkKH(ZF961uc=Uz95bRC_*{*FFGn>)rx9&ze?9MN^GSN)!fuFte z>q`&+>gPY(UxQ|hcJmk69lV`&(pvE)`Da3nu$9kejZl;2`mK5d(b6j?) zPzD{;Aku$n4r%5DDcFHN=pg`W5s^%|N`aYH?Du9`LYyuK>d z#$wQx+F1ugB(O8Uf{aF3?9F3rgKThzo~(GXu*e;DezxMXVXw(BZZqdN@XQf%IztXT zbmp4v(%RQt1$MuCEuv^P*Y%X*NXq;L3ff zoT^BYN{MNhv%IX}UC0x1gdL%}kVCwQ-Id&SdvXW+xb8%9$qmU-_S6mRGrXT`l7C{u z!taHEur{I3@#}S>hWE})#<(>`7|oc4)c zSl7@lH4vj%;|Nw{2dabi?3($N0jn(|n4hD!W|svWM|`D0r?)s3s9e8xMI_H+x7y4_ zHO(Ps2!<9DCPa%kDn1ORRg}<^nS;J3;3SxVCMZW(B9W1dDVbn@NIJ!b@1pwSut!HQ zc9$@g(35VF8auRifQ190hc6d5&F=KZnwxq1B2S(nk^pJm0YTa97viRSgZR=yP?0_|2D+|NY$f_;bwl(o4+!`SJ13Cx8FaBR@XY(sJy_ zk38}t`uq`1);C~E1m$}%h<{C3oDO@Y&1!r87c?+mxB5Z)8v0#5_Tq#UhQ_-twM~&QhtfbYM81pX_*)hV5~tOh(hT>Whgyd10qI+2 z8&=zfkK8Xm4sBu0@UhD;ZcAQawie{p`Z1eGz#nPh2tWF>0}?1MCg`~1$u)F zq|-?{5jv(U=wJscsu#^Q%o#=7oMuFt8PR!uP*hWI5TMXS(xAf4LNv=5co!7I{*MHM zK|dxnQH4bxWK)m?*4Bme7R9)LFouT$nu{+0S4BIh9t%`A=R)mVdC#8qaObL~n~x7% z^VyC29@^XIAM|+KL8GV>Z6)(I4Gdf~5DAXlvUlaxqeaE@R@2heSd97p>7|RWJ2p0N z$4H~2=&5Trp4!vWH1VSvJ>n*vOMY>iswy$c1&Nx&xy_lj< z0@_#yJP07 zi#SDYU=tTbDfRZ zzMr^sd1)x<^O#LSHp@<7Vqq53L3Ji3tAp5}sUi85qD|6VG^eRr7O=&5dIgP+i6;QX zDix4t7n_UhXR>3(;v+r`6$Jk%CZ9_4uoT4`m)>(=Ufmvt{*$#&SH`KOYZ zvCER*FIl)}e&2zy%8KE=-F*i}%B9^+yYAn-@rf(?danHZ-ZkGn%zoqaPu&zQP7e0$ z8?CGw-P_fB(NJ0K*e;qcChW!xv|_%T!gkV<@afEiq)+KKZV(621spCkLEN33(q-`w zAjp^??1a}Cx)p3as9NNop?Z+qidP9_M*L2VAb_e2iiZUDFG#D6=~^?5Q=hX|6<;Z? zu;w_X+>RXiBLG&1&F0QeWr;CWGLal{Y5G+K0 zY4y|VK#Rlb*MC59peA^KT0Lr0mC7l2CfouSrif`m#xT@t+^`3j8@%ZY0AsVP3HPlXr} zN!V%RvvFsy=8qvsD;AC1w!5?Uil?@2`ShVqUqxGS@?mRD@DcW$H{xixk@?F9w{>*w zT3A-RU|VP3p1~4vuzuUgjcXn`+&k~^6IP4GDDVV#fU_V_dy~S;cyJy)Hg}}dTOp?mtZA5k;oYVdEconxf(y9V7O`FyPwM1k}+6y#IR^Ust#prW8F)5)U(5lYl#Bdc1{gRL z*^mPazM4BFz1^Mca98^Mm2UR3+dlce_&U4oN{2t==jKekY|nTnBinuzyIsM{Pp~ga zf0B*^vkXEkk)b+W1gu3Oq#_*mpI~Od-3e<*Cm|F9)&OP5Pe5kXC#02=pQ68F`wi^- zH}HagK!5+D_17+-zYS!56hQ{Su~bApC+7KsoqAdB_m@+z?UMZ4tL)k6qg_VK^5+?T z$Cb%F{Yqa8&iqMy5B#S@Xcb;h*qR!uD~pQ?@+o&A#eHI=-?<@!VUK~JKrX5L1%>Ye z6u6L%_zc2E}+@!LK=8^>gS zUcAItwfNA$;O?=u`ufnxN6lrOO-()Ht>wM7*@41<@ALz+aZMDKo^j}N9{TjEdeRWJqELrqW`<;+RE2Pu4O-v;h%SOp+|a?SL#2`UsH`_XglDQ{kG<3)iH; zWhP1B(VPziZ^}uGe>lkKstKe3k!FUWbDo|nsU}76{!e@O$-tBJTG&WiXOG(%K&%pu z%8hKmv?WfTQrdP^5fG%xw=P2(PS@~(l}!s?ui#?7}ZyYX8$ z^=y9bZ?`>>JoD6eSIm^v)i=8PKUl?=cYWh?w{2-ES+xJ-U)-_ti`Nexaz~eTvSL%m z=A%7*%Rp%&;sb)b0Q#mC?ys*TEO0AX%qBg2wJFb1o|A(8@Sb39fgwl^kR-E~$)GWE ztq^iP;?pHTk?FY$B`PE;gjeJNL~xUgMUWmKgKyCXxs$5WiV|UiX++WA*xVIVZ&HYY zIZ}vc9k3Y8LRwsdyxc~KH3|Ckq;Ueuz=qdK~qhC4F66)SG@4g4RuYU1R@(or$cFDrR`|eNvD-%W! z4MpyLAo&mZWPIIC%jz~P?(zg5xqjs*cD9Jelh#Pj+NM2M-&mMfS%1Yr5ntzlLshIQWnITzm@}Bs0!aZK*?dvx`!p9dKm`nl9C8o?DZ2oAmL>+G z=c$Xl1FQjOSBMn?3il8JpIR=g63kEljaOYeV7{YX{xuIV7 zfZaMce)^w2Ir+?nZC_@l2TuKBd56L2u;!K2_isq-|H_RE7hd;;ZHdjx1|kktVjbJO zZ^z5b_RvGj_R5Y8i=MDA;bt0)eG3yl5 zy|DR>zN0VgPkx3i+5ghfKJl9mCf|E$i+pm+KPTUN@aVU09X$Qu;4R-GTp>COVN7P> zfrOK&<*c|8(N_^lLK4AvC8HMcC7uMq2MN|O%eNh-;F3UpQF^)_rRMOWaBoAetT;z0 z9S{+;q?M*hT6&qHMUf`u(1oUk#mcGgh)+)*mrtHb7T%roox(8i-}IPF!c7S~o|uGG zq%5Ta!AYMsBI+3h;Q5Fw)2V^EcnFC2J8LMJ60KP=)F-KKMj7w`>b~ZlrYW1%{jk#c z!Kvq7rJkElP2J5quF!1)bQ>3bL74>=Wkun<9GAmlHtK~qi>J6Rig}RdnTg?kdOAC-Ho7XQLjQq&uV_&Mj_`187-{x&89(RSk|DyUX9c{L-;YzjkB)!kfQ(-0TgyS*zE+d+M#?=3*D8@JE>K z!hTSAKSsWI5YA;6~&cCJq!gpDiNEms7 zgOJLeabbBmredt5TELN^5g%T`9nDvOzf$rDa@D6CXK8Abiu9p+UW-Ve#MoYO=j5BO zJp3?qg7-mxHNJ+0uO=+{fxKL=i?s5TMxIO35G$y#$tY1M#d>*%wDk*|T?WMpsTB9E zD63a;Rw+zAR*^ue#p#pQt{O#2&DBDDWDC%G(*ly%B;ia|@DJ6{Rt|m-;4@!4a0rUl zAbwL&%%G4G$AA{aq&+rIMuykMeqqhczU2u~OnUs4xt0E8h9o_4OLnf6y({Xo>T+^p z+0sS6jQ6+b@;o*E$*U?WrE9aJp40EhCo_DLC(u4x1{H8V>J@HJSddZdvLICjs-=eg znZRFVx;VOP49CGA6Xs!2ig;i(%B>xn$`v2$rhmNn!h1bhczQ_Erl~ddqk_6gwg0D7q|io1V{|w zHeFtom(Z@z9(l784v!;G6pX@mB$fk)$4|U&DF|@nuWA_m5VqKH}si%B~Tx6S_PFO0- z!y&&f(`r<9lu+Jz#0<_!REVC{seJ)rxhNkqx>P z76uBeL`Va)(yU0}9x;cseIH@9FqyncEP1*b6;0dkQKb~cQ;Fkasshj4r3pk^u!zW< z#tb4GMTHHADCBz-YYdm`bUSlaQ~f7AuC93uz^R~%fLqPN=#L+J{p$9bmDi3H=CX&L ztn(*tc9fLd@vlp+URLq=W8W2*PCX%?Y}k6o%E6=C`dyxqsW(bRA5~nd36% zg9z4?OboF~ez_z+b`06d7K$3?U~4hlo4(kszKxEOCX zx$Tb1p7lMQ6Ws+Z>yKQ0WPMBG$g}%y`o&12(P#72kL(}o**Q?svJS7-wY2R0)Q&^1 z_v@a|%q%D^2)B+@w+=OyRx~U=ynM~44)<vFxzx3+0gC}-( z4fbKY*z>5n0{CkX?xS65_*6p(DT(MIjDrA&X2%uXnR*Q#;yrL$(aoScXp%7q=&TO! zd2L8XSX+RC()3A&1h$jlt5~KL1eXxRR6$;ivrta+(1XB5>vUHnYhOuL%O@W`ouT{N z!+^wu2e6;QgE9DN3`}slY!-uF@H7AP7)Y-n9Tv@{FhbMKJa~yDx3rg7b$Utio%AN< zC0E_iI}HRE@fZb64hfn)$caGASxOb}WK)uCS5t=g*MKO#z5M3&v6qML`0ml8-@S9_ z<=Fb;_q6W(#0qK4ypHM9?FV&(rc@)X*?l%4!Y*T zQ5%sCN;z`UuzXUvs*;{HHX5ooZKRC5jak_CV0M9?l^CshgU!T7^kIKvHcZ1Ir%j(> zWTkT0e^;{espQ9@nVaO~9Z&JO$jxalDCo$Re(uP_%;d(qL#_DX%!St46D)NXWuAVK zuQBFG_czQ@j_^<-BggN^w3?xfXshh8aYPF!%S1m)>eZ`~#Du+F&Nel~*leYIw@$vx&<+uBrd9kzo&f*ZmxG z;TEn;7~O~#VxLNCCM+O4bc(0dYf7AkDW0^KN&<13x5IVTOTrQ#f2t(P63Q!9n}+u! z0hO_);lB9&m#6;nM0UW;`rJ8YGlB;5O+o*YV)NANVzab1+cou_aC;!wULaQ5^N4}>6!eV6g~YdmsBwc`s^zRoIZYPFp#4=c#7lXiR6!2Ql3J88@a4N zzcY*mXq@PGqJWCP;v^gqxk4G99s~_W2{*$-$}{wUFnR0*+neKk{Bdti^2dfiuh;*N zfAjl#0Y_kGevjPncV#s<9Boj(`@qvmZaB#m6tW6RZa4-6a%M_yIPDW9%_LIn9t_o3 z#pMHejaK>Pg8cW33&5#`6&S-e_!tl^$Fye{WSyu*%fY^R|G^DVlw&>3J7Jj8eP6u3 z1vsF11w$*8&a=JATiSHS2$Wbh&&OtjjFh?;OiR@5XPd8fWEsC^bs22F zSByS4LIP8V-8Qz)SMI4OPd;FC1GKOVhED~;)IO#djxYM) zI|^jriR7OA{ihBc!o!H}CiX0JG!tbVAe5>@T-B5sr4=Pu9mb70phYs{Yx*j=qTZm= z`~L{#+djV8lWqI0{J6*WXKN<0e6n?*10L2Hgi@i2MHAlgvf7%mrt+qua3I(3bGytY zQQ#S4w3`hMW1UnjLp|h4+{hl|4rlBjf_sg^k*Y?B3|pqxqa%ehIOyBj_S&`!27ta< zI21r2vk}&mmZ%KR_u0Kb;wsWYIZZ&ZQu+h^JskuLA*3kx%~cy|&FC(rOP>V=BM}&! z;b9t*(i!^Tn;yBxmGWQ7Z>?@lOC6Db$I8}P52LtroeleF1EO?zC_7(vmkcgm+uX8c zu(IopKRmf%Ds6$Cp_&$@sGP2by?{swf$~Q_E^Ck~VRK@7CF&mWu8KJ;(Y7cI z1{ z*T8ecGDwaU;%_ zXV`jtgE8fWC{I%+UXRh9nHjEM*x0{sVR6~uu6dn{8w;I2bF}OA-D@8{)YEb4GyAtc z(jj%4E&hPNZsNrFs$15_kV5U~92w}n?v=|f`sz&}MNB_vst@!3no3hGL{m(qDUX{+ z*1gQjX^M7)SGnL^&&h_FFH>w?vZf)bo0Aylk9u%nFi65%^8FyDex6#Cifc(HPtMYm zq^z15HKF8V^1WY{|&+qsOB%tKpNAB{hgYy-j6UOfNA z-349iijEAe?Y`y}kjsgYjwUhse#bS#3)pYF>Oe2YIlYLSUfuw`6bhBhp2&(6ArGRY zs4`NSo9*V=+z?QOT)GkM#IeDE@@t^RgJ7aa$zm7@Mq$L(Nm?ujIpG|{^P%geQBQPc zyJ!UsA|H%aFV%+>3Fs8^X}PdU=c6C)V8X5hWgiWvos<~!fq8|%w#4wtd-ir9QGShB zv-m(?_xj#yhu0Dft=hJ?VcS1l-Pd{e>3vt<=@g3#y4LFCw*8OqEX!SYVr_M>5Cl}x z5^>G{*f*}-{-qlhUi4>974dw7fPmOaPPWHM{sivHi();> zp`t)L0wN>WK?)P;0o>UHATYKB!3NAu9m7E6Q#xIR-ec(zwb#yX;I-8XTHvsFx&rzI ztr~nil2(<9XUaSnM^1{^baA}V$>f-xu9UtdkGK^zPM*M~=~@^#i4r8)%&ZN)V~&&u z;&h69!3JaOJ65V-vAU4bGYu_Ih$2s9ky0@VsUn%g+l|4b=|Y#r?^6J?xZkiiTXjDaQ$Ad$q#5tcDzWgCq|E=VmT za!I8jc$KpZ764e^Y+xvlI>zYSK+g-0*8Qx`ogbba-eE|RqV$d$NjV%kSHEa1I2nsh z1DU&vh-;IQm>Mm?*K|aRHo+RpWC(-tz_Jb5$N|+mNjy;7;-Kzyz$q&_B+O~~kEA|w zt&%fF_N%V_)y!44zo2Q;O=I&r@@2ikJ&>t`2$OuHXmoV zmi4XKy0f-vez~~nl5os zpnjlo_3quPD+lVKd0_f)ht&8XWTi*=E6>022p*^1Y9YNdg4hL>7gKaxrokginr!w|1^mL3LaIk! zDBxO!!f@(S#1;E0AQiP5F#eUE;0a|8DfFJA*_2KQUk06<26gcEXF5-98M|^x#WUM> z4t=Z{O5c+`V-1^5ES)+cUbp|s!Okf!wSNs-xk`Q(WaSfHArFAtnPJ2)jGcQfNLu;9 z6VW`3X2}76E2lfIN>E^pXd}2$ap997V!Dmaw2?%}g%@SNw!vwfAU#z-Qf{j1(mM4q@&?>`jceoMw%WLo-%_A3`%TCk816Rglr-#2lz{ zXWLmKGvI$Hd6O;2;motLn;-B7ZOLad1A*wX^2?L=nH_8y_M+@}WM^1{?xe-xWcPcl z$y`i1{$s+U_-7nHBw^1CKaxV|R??C%&z$;dP!`>3a4Jp6NWRO_OTNElaLr;KHK@WcdMuCVF zII1lOPo~7<3>v2@(h33`sdS3>fkp*Kl2$l{I$B}8M^QC%KrvC2!U$0iWI}~1tuS;! zAe<0BS0zj>=k*DyU?4|`Y>?12<($Rf05DKx{DoMDn1@D*EORnONed5d-N34h`8)+hL2 zjgt2SW#at-~lZz=qm%yY*yCrdwU;gZ#JcYb1U??6$}z+Ro)f9&N;4t@35f(6IEdgzjukM&O;`ucO9|3-YnEh|=>SWj7W zqHufiaa|_-!{kT2c$OcLd!N)D7$kkGaAJdA0aW3qBIyJ?-ETjYN%`|y(XNJ61fwJ7yy7$NH{m5C@Hu8Tq$0n?9ru|i({sD zk@!ev=VQCLw`A|bo7Y?yV-D^t={ru|#pL7iV9}wWb=}vJ!{qo#ds8x@`}bM?MbJR< zap^U6tq;yx>)Afznf|RbC$Zw((ug80w~4Ry4ByeYYT+==R7MnEYt)i7Um7`Y!I(5p ztT>}Rt!8Si(`%lu4!9A`ykt{?6-1%r8B4VaN&urI6PMP97Dy;c!yS;V>KRMbKsh>1 z1MDPK6%~L|q*D_Vf&uiRk7-vj=?pVnW7zJ-X1c~+dnWPlHq9}%;bZldj7ah^@+BWs zTw~H--+zw%cmE2_J=U8TDw;e_-myf3>K)_qLVTaE^-sCH@Cu-2yNxtD&g*EkLKaAD zj~;f9NNKFZyfvW#;>Jlv8pETlS6V@!GwuC}Vpy}}hf;^go~C!sI_aWBhv|V;1@1$0 zTQ_GD)8Zi|P}FKEV@&bSQyfeY$NZ>4#Twh3=ha!_C%2T%%kvqsY|Zi2mzPO@_2!(~ zeu>L*o!_-{%hVB)t?h`BWkNRa-L%b(w3jx=Z`7+ZMYch#l`%OFiMi>1cSx-CJSp&( zRJv1op47RkPCL(271cbc3#xOTJSl#*>jkDsiQl*QGb0Uy@yfnfPG$d^jcfWVqZ>}F z-u`53nbGTXmNbpD#TUi>mHlfsuI;a+vo$B~Zu;Ua~CO zQ$NpY%Pq*wscJ1KYbegkFKu7h*}P+sbH^# z732w4kycSd*$-C{I}fNL>7mUR(jtdz${~v{TNv zEKTd5Htc_Zc@9ph`YXtwQnP9_UJ{yB2!}1ij7KC zl;*!oEeeH(n*r1TeC6KWR0V2+Z;qhCFada^5gZ$wOsNIzoU;y>)RZXTpxHzegR;s~ z5e^5d*uG=Yjm^(MM%%g`*^cz%a_O&AhxcF6-zENT(p;|LL2K38u-;~_=AXsJQ)PcgjaJa8fyxH!VG-HO~ zt&-oB{*Ha8pHEn-Dhl$0c{6j)ihXH0XXF`}nRAx@dS=cU?Qi$Y@fztH$}0P{m*@r# zA%!eaa@NX`JQ$*PSasU+hjb&zWTbh_PD&$Z70*g@DOpFHOklyK|71wUrBo2?f03|* z!gjMaSANB4lZ|fk_hr9pp*vgtw%K8n?WWh|T-WulPt1{@=5yQN%mz{M z3^f~)C}&`Wf5vN#*wXS5!|4UinWa|7OMU1(H5ZPaC%=f2rv^5_lV{kK$o&e; za=ew{&U^&>Q#XDFS!!ntw%=#?-1j4Q;}14#@@Q@@OV}LA+^KhQ4CV1WU-B`Yqh^DS z`bW%%S2&U|0t}MWcs2~_iEbP6m(&zB5D3>H2{}kYYwt+LAYlf`%u-pI&gps_IRwfG z^3ua|=BH5z#&uSP8hg={lY8{}+fE4yVLm^fza|Sle%h-Aj-RM41f`MJ9DJ2L)e&kAMlXHS&2`X+ zo~RF|YaLmzN@%zRK@i%e#3LURJTV0LY4kYWp#@QuJP@N&@bkUh-Mw~~y>#rzXkD(w zy>PkBY4esgghCCaUVL4?&~3@B8$B{sibCx1j*%V1iRgw66Y-t{i>rp*&P_`jw{F}J zjdaF}Os1lEqA0py+4_uFiN9$r| zl!%3No4ICNQdo>5{L33}l&9W%64g*|9P?PA&0|MY6m}IMq?gi z**=Wrnl&fkT;Pj|{(PHQ{sP8nM994I472VjA!t53QomS59kvIyU4NqDS4 zD=d+Nr+~3=+;snNu(h{Tt;G77$Q-#Oj zO&DnpPHzECUc>4cY&&VF_`Y^+UOBevgEI zqb%OBq$OfEJLQ_z=atJies#m8@xlFzip?2AN58Od&x<#XNYA?Seq-sVZ8w`8Sy_fD zy)IagYch27^&38iJ2!su&{uupd-|r0$IxBMH5GI#x{TLB?er$EllQ9lKz1RM*L>>8{Ni~l;#GRtZ1Y!#J!Ok_&rANJ z&l&j3z^+Q!Flfv1+4g4?#Cob2@xi0QPjounI!r}_@bN?j-GP>y4IZuS325Z|`6VIb z$)s(EIFg4%eZUIEDK|gplW^2K^fB^QQ?L|^1ra5<`S}rDA6ykm5$O(?Pe1_ogd>eW zLB`St(g2k?Y$$HPo)HSPH2C=8ka~m90QH>Qq=sUoR5b95A}EKV3cJB<;*UdlCs*E8 zv9-BrbNR{TcLfVVd3Ue8yJBlo)20gi4ip>>w~tg;kF^yRwvAO+kFR9Y9s(chv}$9;vDxZ4ZarM={h2(8U;X(+ik0kySwZ|0%`EpXH;y&`$7D zCh*)E;$!7V?1rj@vC>h_#844HmXUCb$Tsi^!=-JroEkLaSFJ)b!H*4}vm&a10yHDI zL1{&)f+T4J4kMk>Aa3V?974P?&&6lic(5U>mt^+RW?&d@&T5B#6dKkGubvuJYb$FqYOxK+k&z+Di`WeoX0 zk=(*!$tT(35U)_0Fp-FNuVLGdzb4eefKPFKWwz01YcA919d1o8D+i@)g)p z1QdbN$9G&(`evf@18c&A1XYnJ2p(K;$Z*O5NdOfJVzXR<+5xLXJ`F@ysS}E^Z&FKC zB5LDzK(*s&R-UXR)v8XynuT?_wL_b?Z62y!w79lCy8f0`a1@preGX?y^OBC}PUDo2=b^u>F&Js8F0X2szp8EI%1F_M zo@p0iIM-j<9;xh#l~u%gS0@%-9*%4qXx=eg)7~)kNNj#nT`+r~y0Eb-5)Qiq3zYS+ z>FyDi%18KqeMHh{+*gnfT(DzSFw5kU0>ueDZcgr_Z1M@xi!i+)K8AwyhfW>{VY&D_ zQs_t=VY-zsl;B?Zx zhq$ytHsSU|{3`MJ%BWl!-G-R{8yr)ZcjnLXKOm2*aC-a(wj$wOyLxP-r@Nt!&U?G7}@^?IM4K@m_6t29WKTc^+=xKq4=}-Tt=_3kpL|K&%@(4#3a(Tp$EYs7 zY{SmGo2q2H#TJYXw%}OmavYP}Uei@mG&veyd;LQ%Y})kVL)Wj3)AtuQZF+&ePgIQV zyZNE&zCH$Oan^p{U;VE-W-^!h~Cf_aBOJ+bNWOS|Vabm}c2tx6nox$x4_ zatoXircEzCeBHWueBE^qzqo1Q#fOydXk_^#x8MNniO>G#`sI(_a&W9_)8~Gt(9tTX zLtHFBfjvWY!vD~oA!G;EmDioMXQ&=1fjvW#TuGt~*%LUY3P?3`+Ysao$b~dvQW7){ zr-X+IrxND?096^4=)fy=zYhQj9M()YkY58I00LI!?9D?eu(`JV(AtALe((23l@C4`ZvKHx&;yYjsTT2_R`~cFy-M{2Fv!#*dDrt{Va%nUgYOO~aF9Nw z!x4$_5zy?^U1^KCWK+!bM_3* zq0GejLdY^CpZLsEDY;*PaJ3353bZmsgNHYPd{f{g*g6B#n-~kMcw#KDSOkH>d-brd z(oV{{z>0b<@_ERV8z>I)mZ#l;mfRtId9q9QO!C;VhbO5u_*+iEy!w_~OcN!W4f+6X58qIwX z5hI(a5NM6C4q2=p1qRRvK;Vxfbsug9`hXWMHFN6K6QtkqyIW@7Km?JFAz?Z?36nve4#rliY2n=v=Jdloy*< za#f{kQG3JUraXUbUv-w=XT?dh?qG>0P@ZdB##-aicy);#hw@wMhU%2t&A+C*NnE1s z6UU6h07sgw=BYuFs2cWiFm<0eY!k}xQ+D$+9-1S2Ph9dFTaIV@owiWE{CF~%Y5lX$ zLzNFxZWv-zd2Bh)0nZcoT|G*KpZki*nvU>5yBjzs20(|iqx_TsW2bbUfu|RubV*ui zB7Dp`4`5O;;D4b4K`BpkQlXZIp+$Q})D=g10M8MaSx3v+s7kM+qs_ww(^WHrya{R; zFc25jyoJ&9T4+geL{VWF<0PIUydt1spBDio&eBMg2y1EZ;6!lc0Gm>^F^O7TxLA~` z^pT$YbyfmFq?jMjN2wdEV&^t3kD&Ybvi`lr2L19#DRK#R?>eOA67UD4@{9V)1tt6-~c9{6md$dhZ#)q3}Us#GYZiN zdAbReLQ`ZD(){JAxweQoC|Ob}LXnhob-lnIM+Hz9vi+i8sNmL~}_;!sX8_D8}a~M+AkN z;}w8(ZyvtU(MRNTXW&j6OiXy?xr%XKM#4ZTP9GfKz|?%)wZkKW#SO6(bA#Kb{z<*v zo9`(r_m;Ls%J*ii7|CxMt|{#gI`n_X)%BrlSGLn4A0Kx2)aSi)@I=lqyDD+9K;y;1Ex^Nc#x>SC6&=X9{4<}0UBOWwU$-;^W4z6WgSXy^V-q2n_ zCA_UAbt4Y$WmoiGG+a?Jd{OWGeIpeWBm3qr9vfS{Y-~(^ynJ{+?z|c)FCRJ3H-GWA9Qc_$;`8~EN6vnMh1m?oahZIN zfI|4LLC5zso^y|DJ;c`z6l7qxm9c#}A3}@-e#xjAl zO*1T2wYy}oDzgaoCb0~#i3qVgWOQLRsR`1diKh!8i)xC|J;+GT@Pz9^${m13vnWc2 zzgUXl(j6SZNgAh|xyxo9-Ie@zrw131EWPaX%`-?2J8Gmq{eH^ss>mCZqRy)Ph0NS( z&V2f5yQPVJw5(DxqD@XTMAYm@vPmE78{4(%jTo z7ptyH*Sb^qG|*66L%E5n?oF4lC^!YFg@j6`;FiR3%K{o!)p4_eTEH|26`UGGsHGX- zeX~KLu!dgehl+XD-~r1B9%0$Y{{kMj8n_vt^poI+Od7&1;gE4zw_rhkHzB%`~-=LBXn7rc4U`F4&rx zjhC(zM(Q?Sn4L3u?+i@+-871dKfMqOD3*r2QwLSNg|7*Cd%64o_~0U8v9Ly5pNKde zYgR2^ws>rQPiF^VZ%tKcaVY3m}xXZhgbAw7~ZaMG69 zk`WaQCZh=(_Cd}jLx$ptf|J#VXmrGyVw9L;vzau#OuGnGPh*%i1*6 zEgg17kcMxZb7E6%a<**FNnCc}?Fr~Avx(8U$9Pt|NK}%TRpZ&VIe519Ts&Lx38a+2 z3$$!!Gj{t-#y;8gQ7m8S8qWXS)5Mj||HU^xv|T*8YKEK;g^J|82o=fjlD7%3C2Y;0 zF51hHx)+TU?ilPhQn9h+1qo<~M^GRZIcM-&YDSw5315^e3mueiCnueN=%nV{Rml`U zg`zYV%C%_cu7V^IHOr4G6C2dpBuJ{kB&SXu({-?z4~{w9gr!7md5m_Jp(BaGf$^>9 zz8EcnQy~q>i)LSq_FcLetzz`xz~J`5`kLC%J&#!`+N0I2!z~p({AM(ZS!bVpHQE{6 z9S;7sK>s&z8Ja1B@SkjlAk6Xntr^e%D^>n&b}+5{o2lnNobmk6spmgPe{QHuJ^wGZ zAMJ~0evSO9w_po9g)A0GxG4{VP9{uU45OTMM@w1ff#6Y+S8+)yxf4O;I$XhmZ+Jt> z5I^@-xv35TRM|rLUkVe8sgxESXCKBUGfuLj~O4R69 zs~d2b8(jnb0X@Kxj4Bu!5EMgbcWQDHxi{&`Li#JIH+j*ALHwaKHRWm*tEYb6Ca#~H zteyJqv*x1gJK0<8+iNU&w$w#D>{#+sZa*SXe=6;v1WC-qisXa*PO1U%vP2f?Xl<>H z^|jT-Mfm~050>-*8%RZ_2Vg|&nsE?PyUmI_7Z)(xj7KqQy-u3m`l9ey5C%dj+I@Hi zPmtlzLOQFZ5P@5}F&|3L(^f3%M+fPg3nZEGA06bJy(9)Sde*?%Sp$bWH!$o;hyG5| zg`8J2X8=e#J$_A&4}B=el$!?_MdxT@I!eFrLxG)6D@Zjky>dKSzw9Hzlfhx=GDJ|Q z(WvT;$|TS@c-UTvA<5~E51esT7v~ozoZ}ubWp7j_-4Vf4Hpo9BUYq71DZJ@t_b>gx z8^-Lojcn{U583DTr5vE?L; z){N)GW0mr6v#zxA#7mXuKTw{Z`6dYWB@Q1MZBTUn^F4e3KCVg-Z%ljsmh$|}yLf&? zPwB#KA0yGs5xc(Ppx2|rCZ14@#d$Bu+mLT$d^k2o@J z$3etjGQix!3d7e+Xs_nQsU(ngzzBK!;L(KZWoA7ComWNV0zHsiaij+#(R}W*IO~eU zu2zStl5>;aMxnrl*^G0qxKx0BsP@e;SH0Ak*UF`B9=FJEa0?evQX+0|L*g6V;1+#N z^zq9%_=O!)zj;mfpSZ*A0QSgSp1hVVp<6m6i+G%0;l{6X6Yq)ARc=Z9zNEx&b5qw| zZq$>!q`i3t;fL%kzGnQs624|68VFb3ne+KuGoI60D&^m1e@H7&@RjF3objC2Sb6>f zdXCw>LUP#-+a{ zKb^dP9ovw+cO9Ex%hx3zW#fP);k?>AaOcWfz?Mp(5xJGNx>#9BAlK)yn$_EF>7yQZcnH5wfa7DMijVhk{F?pzEtdYA@KGuMHv4p1dBQv8`480RM)1a;bNHmIQ2Z_jI1o<7r7bo*nngS(gtF?c|MdGrIM+#?wM7dK-F)tX zXpT^eAE}k7Q1!tNC{5~R+J!cBl#F`t!;C9!UjF4-SK2Up@{jV#$C`Wj}X+TLUN?a6~fRwdD z8Y|6FRSvAAbJc)atW^WAMlDT6u9#Vi8h~$6r3q}})k3fgSt;=FH_j{$YDQ8SqpM0& z)yPsKlF(}M;H^dy$^?>W#4idyJGT{=Nl#xW%@2^lefJM;xobmpd14?@UN^jYxUOm9 zhN1PR)Ku1nfw~IZ3f;JP!{Wxu?nT{|{>J4U^Y#ptKihNFbMjNIt9Qp*mv%*KV)@1K z%Ie#7^-sBfKLliwK+l`Xzv@nl5$$<`+hLnIS@@Uyw) z$AQ=L@W3E+3qPFm`N0{_Po~PhHskrnQqSL*@%%{Y`Suylf0TOuy6_{kPrUb!dO8cH z8@FArk{(J#=(g+eWuvRcRxKRpnb*BQD zhtpKa*-Fvq#UHhQP$#tRVb_z{ocf{Tz9yoQ^%o4AS#S?yYUoft(tn-1AqxgUoM`#^ z8p>oAg8)}{m`|+12qS{Lfzvbp0VBBu4XplOHee>LE-aXF&no}aW{W;UWU0_L?}@n^ z$q;cRdUVcFz*kJT6UJz8Z#qT<=_;PLEpj=MkA3s`+Cr39Yc7Hai2*)Uf;>lKW*xaA ziM4COUGa7b@LpnM@c(U@)sWR-v;zN?L7k%^obR7u#ki2plp59twM4Ey`Y#nn)MHa0 zc8awl8<}>C;gDZktdctFw?REFil?+H8)=XLWWzpNt{2qNNwfScVBLw)<6Bzn{;A`- zs)gG+dsekY>^7&qI<#!#_V~qLX~m9HW_SPrjrwgKex9uZ{-auD)I{ROvW}kIQXIi?c$F@+O(Y&sBv>F^q z^)Nuz@jN54-FtJOBR0Up&_W&txfcfYS%x+ge0W9D?!tBl8MH|d4xE1mgPjakWgp4l zS~E@NjuKPaR>CmE}he{IHd zlBLS??aK2r|9}B>J%|4a;Om9%@8ARN-UUUpB<=Y@<@uR6@w{Fp_)7WL@Brn{{1nei zWrD9f-%jPhZ3fT$1-t35M@mQ^?NzR?OSISZ)%R6Z6c+Hj3la)t%{36ZED(?RUCvD8 z*3qSlP;{X%Md%Ps5-|X#T$LL?e_^xK#pk?GPuBzupM37D#0Gq$-XU>o0^<{*}d+$k;lSD@A}q_y~XWEzIbTE6PNe3 zANbVPiGS*JU%ci^Yv=DDsgmsRfsO407Y!Cy4R6zx8mxM6W}myjCg&h8r`_IKbGXTB z_Sm~?FZ<;4yKnjV153M(JhOMrV^{PqU3Toti5n(wuHW^kJ>?@EMbTxK%p19KX(eBm z+o9OF z+vz!Ut_k6vkqdhjzWIc5p;Ni{fuFpJb)fSB%7Fxuww0VS7VaS7!3xbqOuk(#lT2wZ za5b=5VF7Ius+QL~LAk8|Z*%V+Uv+us`~FsLgar!-A|f{fL81^Yh9CqGC~^}Rgn$;1 z(xB)l6AZHoNJ{AL5OC zot{o#d(W=sd_M0afT*2z&p)SjeR%R)zxDk--^=s-p3C?7{z6aQG3M4&8RmDLOPZAQNH9hcOb<<*KX_7B*7Ql!eHL!`utCaEdE>14oRR92 zbEe(vQ*It0Xxgr@lF%r5>t`n4L&*N#ddfa%>6aRLj z1!)z2;UD(n?z#L;Doo~km*H>rluYM)GK9McF`Ew!xhtfo(*epc>;pxb%O}3_&;sXs zTv7VqjG?nfJ^bATi=FoI(aM<%HILu$+osu}bB`3R*zxFnp&84+_UL^%pFFxaamT{H z-sL=yW7C(7y1Q}F)_^ul`|jQ^4(9yP2cjJ4Ym0nU!3apK)xs1 zgV$v|C-@iI!|m61ed@Z~L-+mv=~LJ3_ubdG_FN~=3-mWae^>A`{o9j|GWl75mSn(HmuC2u4H+V-Yt~IQSoyaTQ{ML4o7>Y;o}G83J5ix>Qhv4U_MDV`hJF0~WjEe= zvuNHY({9g6DL?D>1N%p}A8f@BdU7Hw9yu{sKVSQd`qvM%8}ZHx9Pyh7K9v)BpfBoD z&x(w)wEV90$9|$I5LMZayYrIE_cnI@Dm62i_W~zm&(~Wl{AOUi*;8-Ia>fizX<0ww zT##2&rfD@rkyeT9CA*8(qeO2L(J(;WMYvBwiq27L0aUR@-IH5oRJ1|;`j~mY>!&)? zkft|Vx!E}c$)Rqyk#RqkB{JHd`r;aV5gBVp=^de|$Ae ziqi0H_4;Ch?yr~pK?JqHlhjKu=&Qx#TkGep`{7&2Dc~hYk)p=?r490JRZWw(UQ660 zr4^@JNolye?DwbAH_1o6wDP2>g6pPUIVKwN+HCifYkFc& zc7opR`_#;jS0zmP`2B>~Z;!0~q5v5UX7e8KWrGas0rJwI#0*z_B3$e9|NI-qw2XYS-sICb>U?ggBlg&S@1 zhZ41PqlJXN3EeO1Na-g(A97EBZG_xd7}2_odpVy7{dZ95d25cnX8G@~OQ>&Oj|_UM zBKN%IuTND>Bt6~2b3TV;B%~|`HZPP?!@L6Irp&jKvW#9-Soyz3iaA@xtwgQBF>1}- zVWMmQaI$)zBP%WnbX7_*3F6S$o({+VDkO0JW1mA-gRfrMz4(wCrXAgs{1&|M`n!7e2da$+L^bzLfa178)jecA??M3yQw>!uGHC zroS$F{<&{B1@?yTJelJp*yoxOlW#07$bo{S?XYx;pN!NKlzYor*AIQ(*71GZ;@2BBL zPil)q)gG%6da9Kx2U}|6)c^FPwzzGcFoWYM-RGRPrq5V<-~ErwOi!Qr$o=;%osquf z!6}nw%$PLg!Q_ky3$sUz(Ax;_UpRHdh^Y(j&zd|_+^*#P8Xg+XJYceFuIzc*4UobdfN*o)p`RNE^^v=QP^oH@Qy+Ek2JcuEt6R9Z?wa!7qxfa?(-`?t^TQ>bsrV)Wo4^M zUp@P~&eVJ}2ic7jWTEem%M2CVJ>^UHWjyrY)Vr1@6zZipnJQ07o-`qA%A+&y88vp) zx~Y%m`d_I@V(m|eB)*gI9rf71|5?!eiRr(+mhhdDp5G_O|IptjXaB2y!|!J${yLPI z{6B(Wf%a@u6bU}@4o~YJoY8%zob^G^?)yYXjaa{GMrv|+(CA?U?zpSZh{Rt{-8^-} z(M4mE`=<;D56ODq!O`gp$M@?$Ov5zA044r?XmRq-y6I{lq!47!aZ>uQYA}Pdh@3qL z4IDLm{iC-MPX5`{{Hag$624&met(^1eW5ZFtjmO5=#skKt;AWX+ZX8b_f|*f_1|Cd zSzoL==}tCD*o94Qt=|_^^V2KJa(5l z3}R^A8|qk6=w?1g5A)>2bd&yPOm{xV+q%j2*;^`C{Lza~&z}ACi+{ADa?9+5HNAiR zk^a)R;;ozwp}!+%gW6ZZ5Vx<-%hzywYKAXN#o)H3^F5(|;Czp04%Pt=ozD2oL7vb* zeCp^sqL3Rfe8-eS-z_Q~aJ$-VN>1m-eWflIl~_EALxzq?9+#Xj0bm zr%sr9c`)-v)cq|HzSDbR;X}dLu76I7CLh=NjlY;bddcGXN`sj@BYWz^`~7yA5qA&0 zQ^(BorY9vB?w#YU=&MtO(?h8~4V2*NpQ26_@~*&lCzgw7Vc%W8jsm6V6oyi1`dQbz zJM8xerYbjsEF2CG4&N98F8gAd66eN}=@(GHLGjKoD@l$nTJ!It7}gu^<#fH2U1g8h zp89>L$~+M#v6S2jCho~dr*rgu`uFp-6rB<1)=KK=U>vJBo_&ew|})m>+d z(F^KEhWuVTZ!alNl=Cu>jF9uu8PlhY&v9RvG4^{yzWNsp1rkKdVoZ~C2m`Ye9tPapl>`=!qe96e~r z{eJg$Rl-JckNhFePbCxi?GdeNx-DsTpV*T8*TI<3w)sP($uU7s4!2=<_$`$;^3YF8 z8{~nLR!!`NJwqtJj;Z@ltVURVHHl6N_PextLsXk~6-24l}0}=#GV(ehZhLpGX%PW@(J$_hKSc22?x=*Ch2FY7D3sHh%>Z( zWl^OdRfW~3$fBt_td`inJ4=yYM=+`92L$5Yh)(>1A92gx%DTv+${%^YRB;-y#~wfc0@nYtCl~*$M^VVZxnVv&_a=<8-Ad93i5ZS z9M-bnEfJEp)U}tH3E2%6XcyCJ(@KauS_kO*C`oM}#SwjmjvPm)?RrEu8Fj8E;&t!t zj^{QWT;d%pMTx`dh^XG^YGU&$ChU)sZUVyl<$lW^nWS$-TQzRZmRt9*H|L?~>p9dV2bh z_y7FPVQHWIUCM7FLt6Uu|2v%{_$Xy)!mgBGY21(*JbqiA75Dl7-h6Sc!fol{Zci6? z)k)#*%yjy<%sZVVE_70f;f5+9Tw0nE#0^zqxRjEinf@zN>EybT$ldlgZQ@W$IANc3 z($6~4m3~2(yb;#PjR&|Y6yhAG#^=)#_I>hU+VDGHem|TxcxYP6Z$9Xs+7j-cD(hLt zzZAXQDL+v(-MsnQz#Y)PXO3*Wr0E&Vr1#c|ur`)IXCiElL?n#QOzEBr&zP35yR!et zz9p$isYxY$NA|D$r&vn3Ps&&I=GBC+ru6AF|Ab&ya%I(^jedxlROH}R32(JI(B>g5ziR-(n>C)JxI z1Y;G!>v+spQvSiu29-YS{x7sL)R^$2#GfY*Ng1E=OvL2qC9-M2xB-_3E*kikQWhy3H63x*~P zjSf9=*Z8}BG%R)4vAc)eT{S#ucznd}k&{QhGAeb{v!niX^fyQU{GNsPeEptd_k56k zU;482ua9|V?5d1G89yI)?%o~ak7X{*jNkXI`&Zn*Z^EVtpGzk8yP3}MW@{|Kg z$am<0We;>_&&jTvHfY+MX%}*m^xy93uRi$VjPWymG4sBeALTwdt7`Vf*(YXSpOf&= z{D<-%YMeV^?wj*A&HMKJt@D5Kr9odhxM0A7?F-I5{F6m97k{+m#FBGM-d%Ea$p=e* zw&bIwv1J>UJ+myj>>JBoURJa0(6Tp|U0S|n`S#_-%U@hxwfx}n)5|+oG^}V`(Z1p* zD}KJ>*MIc<%B3sUuFPLquyXgxvX!r_y1x2f^HTB#=Z(&rkoRETg1nV^8`dPO8L(#f zn(=G0*UVkBY|ZJlHER#8eRJ)lwLemuj8PPoqU*|1T+1e$ey3kd_`2-V8oW z93Ipqy%;>G&(@T2!P4Y!1bLyWL0!VSphBNziRnSUzT2WW-%SY@_;+2xFS>rMYjgBz z*5_G$3iP?J=UaH#fkcfmMSFbWZ$xKPP?vZt zSf+oMCJhUgB^(NdCw`)Y+3SLRQd>#rw_R6sy-ww0DO-bmzOK*Gq*eM?zeyY)>`UAd z%uV=3kfrNi*RI6iJRUVMIKUgfjS^E5=KI_DPN3ZTxep#O!eaiIVp2U9& zqN>{f$+j@zv|>LGa8H$W&$VZi)_HiaSod#9s0;G+S*!aS%{zHkFd<=VP^`bpbbWWi zzp8!*f|}%4f@k>b3l>WES?JxmzwOg!LD$c13+!N9^n4PY>AEVKuj=3brq8cZCIs2N zcCZa@{it5w@ZZ?N_UQRw3)w8`a&XCd|GZC1zOLIAvcs*PgrMtxNdL9^w^N`0D=9Bn zA$hy)U|Zb!kzVxoe0{$DsgG=d&GfHrnfi+A{i9&1X7h!-Sut4@n=MK01AD`mFSY>8HmI*50uH zr}x+f2X$9o&s}$<4@)1ZyK-;b73%tzuK&_?x$C=KfBJFP$G`mezg|0k?d-L;uDyA! z?%H>*-S^Y?J|jPbZ--crmA)mGp8rfnELgSf>GhLhAzet1y}K%wG=4)YY0(qw#$=2c z@$$O#*s4|Q#>D2YACVrL>C(*g>(gU>7j51WyU&02U6dZvM(UW@RNwLLs&(nlq`&;~ z=JZ&2)w+CLQ6}Osv9L?pEgKViFn>h8M#Ljx!Nm3Jdw7d^LRPF##)4RiK7l_E$5I|% zy)M@0;fZG@&%^l(Vnd%EsrwSM^j*4GCM)u@p0i zCEUB9r!H^xRr#&3AQl>$kuGAQuRD_NUGVbD>Eazro-igO7TVlfmbCm{H27}4_$?8a zCHb*$K6z7?w}Rk~jD@k#!?9rQSxwR;_M}*!tROvKwBGKgJ*)*U=f9PbFmX~WHA@%! z<)=R^HuO%X2b?RJ#xgDF{*jrtXS&ASn7mHv2a#;`VtA+tGA5JGc(d( zer(Db_zLeY)sQibZriv0L%7UoR~egQ4f}u!VCoX1>)w zbf-8D$V#6h>b-a6O9z{0PKpi8nta!sNwGnn^Q|O*N_V7Xy_FCQy*GVw`VyQW;oe7H zetAj8l8nty#zGkj&MFPxokPT6u*@=4O4tASHWr%r^vjbo($nX>EGl>0{5E|u->1it z9KrUdj9HlZzrZFrH^PEN zWIKa@tKX@;$ZcHJd(%vh?6l#Qr^ksSZc-seYZG63Y#d) zPKpghdetnUM>oORb(7QQs6}`CO0Pn0Dlg?;Rpt?WyEztG^i;-^-OVebN1v+Bq}W|O z%pUGlXudlT3DB$aVObgJlP&pTHJ&-^C%@G_^0YMJ}Y*|#FynS zc8r(R9zIidnQC&ZuS6J!KJ9D0>X##_xus8*zjsSHChM(K^#C_~vR6s}rq?a`!yL`( zb>p3rF>}P2TZ}$teNRQw)#&Bu_o&)qEqkvS?zOmMY%5o(r`|UtyvGtQk`B@rs|V{9 zDl;oK*&>ja#Ss z4{m*cl5fqXw}bh>x?YH%&gdq?w(6s(qENpmv zqt4hK8?s1^=)QbCq#j#$)7xVS84KU;tMeEW-|jcam^M_n{%q2HDU0$J>RM95#9JSs z4Z)uW4f^lTgKv2hkbFt8TY=t7{6^PD$(NFnyMFaa6}M|F@MW#v4)`R5rR)Ce@i{MMtp$e=9YrtBt4ty1?r*4O+)nV`m zcoaMa9tTf=Z&1UN;3@Dlcm_NRo&(Q=7r={P19%C15AKbWuOM9$cojXjf$d!B06T@s zDfz!q_Do*e>C~b_rvbaA3QHm5I`5yMzPVC9K*1RH5w>*1L5_3vHLMa&W&Z zv|Ym3C9J3=mu;7DV7r6^+a(;>F5$p-2?w@IIIvy9f$b6wY?p9gyMzPVB^=l;;lOqY z2ewN%uwBA|?Gg@bmvCUagag|p9M~@5z;+311npYcF5$p-2?w@IIIvy9f$b6wY?p9g zyMzPVB^=l;;lOqY2ewN%uwBA|?Gg@bmvCUagag|p9M~>loz^tkF5$p-2?w@IIIvy9 zf$b6wY?p9gyMzPVB^=l;{iOL1gyX>pU^bWoF7CRfZi(B6w5;kBZi( zB6w5;kBZZgctnVsTc|+G_ z;YP{@P~HaRLNLmeBFe>-_fmcd`c+^xSOeCAb>ORDJsjVoe1+dOfz42B0b9X1*v_{d zV5e}9WM3)lt2`Kkqyd*B;6T1j0|)c%IM7lLlGLvVXUVGv1+yjNAjzIDd`K-?E8~1y z0G%jU43=m&24J;J~i=x-v*s7_1(~<-y!Ds_TTxqrtJlsNpuGC8o5cnSOgcfJGu75GE&J!;j+Jy(#r32a6WE#Osrpp|kQY~xBhcXoiCLM7Z# z`^}I?{a6^L++WYH47Ds@A1GhVkVhE@bI&+%M%Mvd$yH4<)EitE&gs%bUA@62;XJO- zhfY3N0JSJs43u2Il9NnwnDgH)4o zip24^8KO2$K5v`=PEvf$IQhJ<Vt)apI% zxdP25uo*5bU@I60+xfNw>=ceykFiy_4J-tUz`fuVunBAjJHSq1CZ3at=VanJnSnhg z6VJ)Sb29OqOgtx3ea?^dtvx3b&&kAdGVz>DJSP*+$<*mO)3N7dO2eH(drqc$U86lG zQ==E7JttG67o$BVQ==E7JttHBZA@s-$yD!ZwC7~1k9FCelc^EH6~ALhcE4YBULi~a z2XkdqSEH_s2FGg5e7~gdos+s|2^Y)T@7L(dxD;H)ovXn-uB@TFmhxki*MTp9B~U8` z%fNE50;~jI1mA$dN$?bS8axA@1>c6|Im+k33*bet0lWnMfIHs-{|fve*vPk6(LkGU zk~DKgIIt@&OaljVWgJ)nmV#wqIamQ!f-izs`E8qUvb^rHFhl*uWVJ`*1TY)S0T*}u zMAw&qOTkCvv6D5v_4T#jm(>O*>)HK7;RbP;tXAprHs}|EMc`iWB`8;c)nE-+3)X?J zf^R_oBzOuu4W0qdg6F{V;05p^*Z^Jv--B8svIbFoFYwDsk{L?8z~o1lWo+Y5R7tVN0;lf6D;ET9?HdhyO%33L8l6=25Z1tunv3` ztfz+7`4r6vjMn)S%?OOv`4r6vjMn)S%?OOv`4r6vjMn)S%?OO|LDM>)qEVK$*910G zw-)d!`fQ~f2iv&P&Yc}#r%-8})k`P}Q~gOcy_~Z4s$a^cm&>M?%chshrkB(6ggf2K zWz)-L)5~Sk%VpEcWz)-L)5~Sk%VpEcWz)-L)5~Sk%VpEcWz)-L)5~Sk%VpEcWz)-L z)5~Sk%VpEcWz)-L)5~Sk%VpEcO_LP6^bW9rU8%w}a4=WKfs^DR(=@M)3m408r^!!@ zOTj#FEm*?+rC=FY4pxAb;EUiPs2v86fJeb&;BoK-_y&|uf~UaK;2H2Ncn&-dUH~tG z4d5lP5xk0YZNeNZn1cm#u%Hsr%Yr#rFb50fV8I+Ln1cm#cuwVD!5l1@g9UT2U=9|{ z!GbwhFb50fV8I+Ln1cm#uwV`r%)x>=STF|*=3v1bESQ4@bFg3z7RY z+AiG4m9KQYsPZ<-h2RU^UqpE?=;!YY*~sYU?+n?<=;!YY*~sYU?+oeF5>02XGo?49 zpZhbVH>02XGv&$tt)Kh3%wBUvdAG`*z2<6#%;?!`uDt6Np=YnT;^lihd(CC`nyc6< z-|5+FuIk`#J$ucSj~P9C&1LqQ%j`8*{n)p3#k1F3`IynO*WAFf*IZ_=x$-pA_v|%S z&q06d*=w$zhAw;dnj3ibn#=4pm)UEso|5gl;@NAiJk4d#UUQkf=E~nJg=eq1foHF| zfoHF|%wBT?&t7x2hTv~Kd(90zd(G8Kg0Fb?nk%guJ$ucSR*jy$=1QwZ&t7xojppvz zYpz@`;_az@WybG0I8^z1cPD{@B9UUT*QHG1}% ztLLxLv)A0fv)5cbg6{foHF|@*iLE>@`>GAx6($XW>z^4!9&#QFn9z! z3LXQGgC{_*TF;Wzj9#^#C94^|YCTIS+bYW>(#Sl5n~f* zi_F3zvt$wL&=#46MP|t&zS7Q}9bl($wsd}3=&}85wNRtS_OsPCjUL<2mbQN)^w@s3 zv~Bd*el}y#*^EVJtHr&kD<0d=W^6y3vHfhu_Oqq=%ewBd{cP#h=&}85wFslf_OsO@ zj2_$1R*NutY(HCmZjK&j&SsoBn{noB#+kDjXU=AvIh%3jY{r?h8E4LBoH?6u=4^Sg zsd=0^TY9@J^w@s3bYk?_ezv^yvR3VrHFKOJFWo2%Q;vWG)oaa>#`1+}lm~OqDCt(a zN1#1+j`SH5j^kU8{O3rkMn7BUNVhI~{I6)Xu5St#LvsnZ6kMix!5sB?ro0-=KJ&%|p%Njk8m?O&?J&%|p%Njk8n4`YVvL6PIfJeb&;BoK- z_y%=237!H^gJ;0A;M>&y9Od)i1@I!+0A2!rz@6`ae+B*!^h{)qJjC|B0ycro=%EF? zirrf&$H6wPv~y<%*eQHSesW1@e|Sj#@FU@PZ~~YO=75X4KGe5Mz@=awxE6f8>u36Q zy~e-~$(qJ(P%Z?Ez`fv0P^$u~!5Xj@tOH*K-+=N-@Dz9&JOiEu&w=N`3*bet0lWmh z2en4ZSExf1*ba7pox-`&zz0I_3C>kpFnUjLu3CZ7{rOz_^SSirbLq+F(v#0sU*UVa zCpcFgW%QolTzQnydxCT2QAYQ!bLm~@(!0*3cb!Y`I+xycF1_nqde^!1u5;;K=hC~* zrFWgHzQWYp$IfGwavrOc^H`;vC(B;db+1y+lUzR*dX;jXN;!{J%6YP~xpcJY;5jZzj#x4tru@_fqcyZ%vE zp3sWfB5`*)pX&wuDhd{Z&0q`I3dV&?;kXozOEnw4rYq*S6pl;bxD<{{HOKU~=C~A& zOX0W_j!R`(|H>Sf%4$Y)Tq>;^&2g!;dPML2PL`$~(bLDM-DBavu5Sp_zyhvB!5zxb z_K5m$;~ub>>&;*bc$HtZQjUXdy0RQgEyq&JB~gQ}*iy@})N(AfTy^$!TWYyH&}d67 zm+u*EspXQwXiF`Z6h>QWrP_6)a0$2+%mdegZ-6JkQ{ZXv40ski2c8EnfEU3A@DkW4 zT!k#FkYyFJtU{Jm$g&DqRw2tOWLbqQtB_?CvaCXuRmidmSymy-Dr8v={ngN44gJ;7 zUk!a_BbMG)Lw_~&S3`d_^jAZFHS||Qe>L=1Lw_~&^YF1ed@K(i%frX=@Uc96EDs;c z!^iUQu{?Y%4)5$2D+V1IIOR zTm#27a9jh&HE>)5$2D+V1IIORTm#27a9jh&$K=Ds!DI4a<3c?(9@7}Wco;ka9tDqq z$H5ceResebT(7a&n?h4t54H80FZjwhaIsq7dU>63DVPVY1xvW66f6VF!3wYvd=Y$u z`%i+Wz|-Iv@GN)^JP%#~FM6SS8nRP#n% zaeH|}&q1Tx%M*IK8Qor<(9_N6_VR?DZbrA4C-ihPy1hK1r<>93u{rHM!v^7+^Cta(K_6ynXl10+^Cta(K_6y zIvcISjjFTJI^3u_8?D2QsK~9k*5>Z5ti8 zRv>K~9k*5>Z5ti8Rv>K~9k*5>ZJWE})(SL+v2>1GE0F(K&yHIw(744{9Jf}Wam&hJ zoBBgzUyWh5saJH_kv7|8sog?H+H8}J{H-HxwrO0qLg+}FZS$F z(2+LV)I*w%BW<>+hcr6UW}CEabfnETY1`;Xn{Cpz(UCUWG#)cGN7`&tk7{(J%{KL` zE<4g@nR(9x3#or0^)ICUh19>0`WI6FLh4^g{R^poA@wh${)N=Pkop%= z|3d0tNc{_`e*Gx+f{#G_YU=TJ*|x1q24Z8 zjNYN%E?G>+JJj1Hi_tsO+a-(9JJj1Hi_tsO+a-&CIP~IuaF4YxNb`+G+ly^dTCzN-}3ckmbcghMzQ{E{n z7)^PnbbDV=M7u5${i`awUn-(q7tyYZXxByJ>u=pJ716GXXxBxw>mu595$(E&c3nif zE}~r*(XNYV*F~zEDY#!MqFoo!u8U~bMYQW8+I11_x`=jNM7u7cT^G@=i)hzHwCg=+ zW)GU#gJ$-i8Ly|$(u~EL*@I^GpqV{rW)GU#gJ$-inLTJ`51QG7W{O35nO5ZeBrT?u z71PR!#mm?IBvpJ6Wj{%aX=TN@-t*n?< zR!l1^rj-@b%8F@a#k8_wNn!4Ok`~j-ifLuVw6bDaSuw4wm{wLyD=Vgz71PR!X=TN< zvSM0UF|DkaR#r?aE2fnd)5?lzWyQ3zVp>@-t*n?|Q)}FCM!WkKK#M?!{wERR3kl6X3|S64l)3HJ=jJd`je3KUUdmJ|*%f zqt|>&eRrZ=si6qkKS+e+w*L+GelQKFot%Nn764rc5B%`l* z&8LJlpAy!5N?7wLk?j7~Yd$6NB6IYbPl>$9=rx}bd6Cg;J|*%Zqt|>&So0}i&8LJl zpAu=twep%z32Qzjtof8kSLWh1pAu=w=rx}b)_h7>^C@A?rxcBqqOnpmR*J?-(O4-O zD@9|aXsi^Cm7=jyG**hnO3_#;8Y@L(rD&`ajg_LYQZ!bI#!AsxDH&uG85%1?V`XTp42_kcu`)DPhQ`X!SQ#2CLt|xVtPG8n zp|LVFR))sP&{!E7D??*tXsis4m7%dRG**Vj%FtLD8Y@F%WoWDnjg_IXGBj3(#>&uG z85%1?V`XTp42_kcu`)DPhQ`X!SQ#2CLt|xVtPG8np|LVFR))sP&{!E7D@SAHXsjHK zm7}q8G**tr%F$Rk8Y@R*&xHIT|ZRW94Y99F3Kuv2rw4j>gK- zSUDOiM`Pt^tQ?J%qp@-{R*uHX(O5YeD@SAHXsjHKm7}q8G**tr%F$Rk8Y@R*&xHIT|ZRW94Y99F0|=u?jR+fyOG(SOprZKw}kXtOAWyps@-xruTWM zH>f~k6=(L}Qg`tP+h?qOnReR*A+c(O4xKt3+d!Xsi;ARid#(L}Qg`tP+h? zqOnReR*A+c(O4xKt3+d!Xsi;ARid#)FMkQveY6=Ewa=iOD(e0B1xvvL-TcLz7EaTq4_#AUx()F(0m=5 zuS4?yG!H=Y05lIk^8hptK=S}J4?yz(G!H=Y05lIk^8hptK(n3*oO)5-sClm=aO$-O zYIFony`DJvLPy}#iq#9GIs&I&&uf<*fm2TePQ9MjE;|CJUNik~ z3Kv7u5jgdl=^Gt^Q%?j=JrOwdn)~~@BXH`q0^qVEaOxFl_D!K9aO(AB-!F6oPQ7-@ ziiM8Asn;5_>+cAhdOanLj=-tcI+G&8wbEmB1Wvu4p8nPmIQ3dT@I8*esh1`#iz9IA zrAebBaO$N=qa$$YrAebBaOyQGFggOKUZVn|BXH_9Dlj?%r(Wv`-xMAOkAO!(N8r?J zJ;CS*oO-P%~vQ?K;|qa$$YwVq&f1Wvu84PAdn;M8kX!RQE_daWuL8^BATBXH^! zZD@1^PQ9WHjgG*n*J^|BcLYwoMh-?t;M6O&&FBc6dd0T6>3j>JMr3X!K6~A=S<3o%%!K zW%N${A#rI44nzMi^bbS-F!T>Y|1k6qL;o=J4@3Vj^bbS-F!T>Y|1k6qL;o=JmES^K zltln^{f|KZ2=tFYUwbuNcm0n*{|NMtK>rBzk3jzj^p8OQ2=tFa|0wj2QvajSKMMV$ z&_4?OqtyQ>^p8USDD;m)|0wj2LjNfAk3#<#^p8RR81#=p{}}X-LH`)^k3s(!^p8RR z81#=p{}}X-LH`)^k3s)9^p8XTIP{N0|2XuIL;pDRk3;`B^p8XTIP{N0|2XuIL;pDR zk3;{2=pPAAh`!MgEGNXpWyj1YqLwR;nK>cf_P35;Il*5432}GXF*7Gr2mi_uEGNX# z=m?e*;%IaP%L#Ej5}btNNjRQ_<4HK4gyTs#o>Xi4mhLpilW;r<$CGe83CELgJPF5> za6AdelW;r<$CGe81;?qE@eCZ#!0`+m&%p5v9M8b<3>?qE@eCZ#!0`+m&%p5v9M8b< zZE(LK-GqTdjl zL!xs?bPkEmA<;P`I)_B(kmwu|okOB?NOTT~&LPn`Bszyg=aA?e5}iY$b4YX!iO$3E zJRHx%@jM*Q!|^;E&%^ON9M8k?JRHx%@jM*Q!|^;E&%^ON9M8k?JRHx%@d6w#!0`ec zFTn8v952A}0vs>E@d6w#!0`ecFTn8v952A}0vs>E@d6w#!0`ecFT(L6952H0A{;Nm z@gf{A!to*;FT(L6952H0A{;Nm@gf{A!to*;FT(L6952GL0gerDY=C0}92?-+0LKP6 zHo&m~jty{ZfMWw38{pUg#|Ahyz_9_24RCCL<0Uv=g5xDPUV`H#I9`I|B{*J!<0Uv= zg5xDPUV`H#I9`I|B{*J!<0Uv=g5xDPDp!+wHs#j=-HW~p$9LiQE*#&5fc2Do2Y*i^>3p7P1L`M`ZrPk zChFfr{hO$N6ZLPR{>`fSGL3h=r`fET&Pt)9gPK)mU-zD7vuf_L_cWU|uQ570s97@_ zqoaeG+0$%hPqUdlO~r$1PqUdl&1UvAo7vNBW>2%3Js9CcQqoaeGHBKKbbXKco_B5N> z(`;r>vza~3X7)6j+0$%hPqUdl&1UvAo7vNBW>2%3J z(`?o(!`vMm)T~*CrE_#pvn*mgJ36RYvk6~ubWpQq6Du|Muw7cPOAB^s!7eS>r3JgR zV3!u`(t=%DuuBVeX~8Zn*rf%#v|txS=t=`E*rf%#v|yJO?9zf=TChtCc4@&bE!d?6 zyR=}J7VOf3U0Se93wCM2E-l!l1-rChmlo{Of?Zm$OAB^s!7eS>r3JgRV3!u`(t=%D zuuBVeX~8Zn*rf%#v|yJO?9zf=TChtCc4@&bE!d?6yR=}J7VOf3U0Se93wCM2E-l!l z1-rChmlo`DRqcIba8)hc==?&;lcat?nNBosQqBy}`Gu~^7Dne6x=O3p$u_n9t7`QX zLgyD!3_DkxU+AhvIG2Ua4Ruv*-;|wS=&Gz>bbcX4Nl|`^9x;->_+DoYQ-m8@yS+v zvK60f#V1?w$yR)_6`yRyCtLB!R(!G*pKQe^Tk*+Od{U9(^2t_wvK60f#V1?w$yR)_ z6`yRyCtLB!R(!G*pKQe^Tk*+Oe6kgvY{e&A@yS+vvK60f#V1?w$yR)_6`yRyCtLB! zR(!G*pKQe^Tk*+Oe6kgvY{e&A@yS+vvK60f#V1?w$yR)_6`yRyCtLB!R(!G*pKQe^ zTk*+Oe6kgvY{e&A@yS+vvK60f#V1?w$vAe2W0yE~iDQ>Ic8Oz`IChC+mpFEbW0yE~ z@#)*CTHSD5N*ueyv5R8&WtTX1iDQ>Ic8Oz`IChC+mpFEbW0yE~iDQ>Ic8Oz`IChC+ zmpFEbW0yE~iDQ>Ic8Oz`IChC+mpFEbW0yE~iDQ>Ic8Oz`IChC+mpFEbW0yE~iDQ>I zc8Oz`IChC+mpFEbW0yE~iDQ>Ic8Oz`IChC+mpFEbW0yE~iDQ>Ic8Oz`Hu{P-`ieIC ziZ=R+Hu{P-`ieH$LL&+KiZ=R+Hu{P-`ieICiZ=R+Hu{P-jkpvCLtoKGU(rTi(MDg< zMqklJU(rTi(Wa5ZNZs$gqK&?yjlQCdzM_r3qD^{s9o$#6NzX?26>antZIai&bzjk@ z5rwI_uV|yMXrr%aqpxVAuV|yMXlGp1F3(gy!nmlNaZ$UxbhoZ}T&FBweCu&hJ5skZ zE^237)Xuo5opDh++8GzMGcIbErfb^AJE(sL_3xnm9n`;r z`gcY=SDn;f zF>aKt|4!=PN&P#ie<$_tr2d`MzmxiFG{mnwuI{A%oz%aR`gc-)zfyaHGvz1wwZ^H+ zl-pfS2nOh{?s8(VHW=DdP6~zvTYJjMI-OI}Q%=$K&YtoBW%c+)up-#3Rq(&>r~SUee)+Oe=YdB&M$pEcuse3;oqm!OQzqTl71TDsgUwonnj zPwV>ERNARKp3+~vd?wvimuE#~hwgWdn<@ImQ@Z~-{k=ow$@)AeX(x+LRC<^aJQ^$( zCBLOW|5LV%-QA_z@TYn=f?fbCjV5W=L~qoSHTr7Lq+ifqdnN;v+j5Yy5e?Sch=v4r z$~t#R|99&x3?qV(!6=Qt?~x2+v}2N?{Ac$nw^*j4G4Bs1NX{(9HcVDMth;RGmB~?- zk_VN0Vy2!=v!t0hI*B@0Po??6mx2Ys!?MaE)p&_cussqi(+RK@!5``D*Q3(cYUyE( zeB-g;acOg%PQh%@DU^-DS9Hqat3iISIh3ds=(3%Kx>Bo68t*&jn=TwXzupE2X6*XN~f>LFIr>; z%@)-sY6PX{<^LT#6TGkfq$Bu`((OmVcY_}Xe;fQCvfzIW{vSmnY?bc+L~-;5vgAQo z;7?^0d&ExJW>@fnymYsGtw_5viaJyd>F)>sLGOn6X7FdhFN1#yE(QNNhy`y29|ZrW z-du53D_a+Wi<)_#3(g1sDX0v782okcPAEC}Z<^u%O(-SQCzKlM8w!W|C9QmH#fm;V zpMP%Z)Gtl#`FCN`qMgyg@E=Dv?|ORjQ=7l`bY#nOPe-5r+H+syukhxlcJAo@V&GHH zMW5Qa?U{n7ck@->=yT8iaraF-o-5eWeUshAZ@wEG^wIk&2C5v$JEqE72@4mmSQ`u| z*u3L;`Geng5$Fzof3vJ#{>jtP=Ys*=sPFu}-^FIXbUzT1Eqwphf$t1_r{Cm(?+l8k z?H&|QzB=GgzhCrk7;q?bq5t*NXA^b|IFwj1;80Rl(%1W6Prlk`L+Z1Uk$uPZo80dg z1G5G`Kk)g!9}LV2KdCZ*g-3@^hgXH444*d5wB2dD2OJXp)BR4T?e2HlSNi?p=6~jM z^S}PryZ?)f)Nf3$_djvz`41j9{?b)*umpqR-RQs5c1yagYE^Dc$_m`mlH5|ZG&Yb7GdCr>WoO#Ze=X`n2mgih~&XngodCrpO9C^-==lpoi zj_2HX&dlSyJkHAFoIK9R<9s~M#^YRg&V=VYc+P_79C*%v=lplhe&^hG&V1**cg}j} zoOjN6=X`h0cIRAo&UEJtIL?2wknC&Dz2?ko&b#KUYtFgmjBDQc^^ULid%e%=U0!Ed zbB;Aq?XHRqP zG-popZmaiNz0>M_R`0TUkCh!(@pAqOXRmOMG-pV2el%xCb8a+eMsr>?XGL>PG-pKf z9;mZaI2W2Tp*atlv!FQ#nlqp||CzI&Iro_}pE>WDGa~MiJyT`RRM~TvY`9A{T&DSg zXA9RQ>2*nZU6Njxq}OGyU9#6M*=v{VwM+KeC423Xy>@9d@3Fi`@*c-~6z?&-NAMoM zUzar3CCzn7b6wJ0mo(QU&2>q0UD8~aG}k4~bxCtwl3bVFQf0SPJ%hY@s8Kzo&P3%rRL(->98}Ig<@{65 zKIPm~&OGJ3Q_ec&oKwy?<$P1lHsxGX&NSsbQ_eEw98=CP<@{1V(0A|X!wPpyLm!5*ON0nInNV0ign!?o}8W7*_|?EH)nQo zUMFXDa!#jg{p)PR&gSG?PR``yJWkHyYb0p5%g1C#SFIs1}xFFEs)^Da5-l5;LO<{0^C~&3l5;9KqmuI}Ih&GmDLIpp^C-P19?qfU3`)+QxVRr1@8+@e|VcHECS=2lR11Bxgf% zE+l6{>ek{lY4KW*7N<&!Q>DRc(x6YgScBK3!9&vEA!+cCGAuXMdmb8bfk8>KG*2npboXyC&jGW2Hd5oOJ$T^HI>EqlQ&R*o) zMK`sf=v>vKTN{qfy(VpF=A%z{7EdAv|M^hA)GCTTN&3ZQ{X#3R`uJ45bDB3w zM~%{v#~&VhG)mS+$=WDc8zpO_WNnnJ9#1q%)<((NC|MgNYolcK_@PlV9p??`t&uYZ z_^i86y8E2FGX?mJyHB|Le7jG#`)s>Uw)tk(@Q?PU&-zuc-{Zq=Pzb>~*yxm9y$ zM|V25(~+Hy>vUA7V>%tt>3B{@b2^sOk(`d>bQGs!I5(>ejn=O>irZ+lqtT-BtoY`O zlCt;fy5kldwbDi;|Lu^=omsr5ITO)(Swd1bmXAp1|2o%m_bJjI$qGx zf(`my(#LUvjuLc?pd$pk$Hv+T)_0B!bX=gL0v!|Rh(N~!IvUWifQ|%o9N<{_t=HXt zEZ^bBla9MsugqqH2OwNP4FCQXc#Pp*_UMoJsY)S|rtxlDfe>2bPuB)lKtQ?foI>zxQ^ znsA;8XPL;;#~CKPgY5ld?;d;a*gMDGH}zjuedH|+Nv9nt5g zKF9R&dyf2;Bj<`ZsgLtSI7`GCea`CR{1DC#;oK0;4B@;G&I;i7XW!5`~-Z%8Fq4x~E3*h}i?-qKm z&^v|RC-g3%_Xxe}?=^q#4tj6UJA>XA^h&?i`Mt{THGb~~dVSxk`(E4k%D(piy#wg| zKkxo|?=M|7T`Bu{=X0fMyHa-4dq?!~8opP+yKDIh-rTdsW`C7G9C>UJLqz){+XI`{T`8aRPgO@3kba eA9b%K4d>qktz-7r3SENM5dX9AQC$rMkNkg8Tis3o diff --git a/www/bootstrap-3.3.1/css/fonts/LatoBold.ttf b/www/bootstrap-3.3.1/css/fonts/LatoBold.ttf deleted file mode 100644 index e8b9bf6a20e1f67fd0e8b42b25e3f0e627babe39..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 82368 zcmc${2b^40*#~^jy>qAR^u9YgGdq2Io$Z_5oo(5g-Z#A`3+XWlfrJ)nFn}V`6c7!F zAVH;xAPAzbB6bD)tFOLD@dJ53QOHid|8wr#+1bq|0rdC#0?Evrd(LxDdCt?%a|9*` zf*t>81Y7^yISZ_depw^1s+1r&E&U4?bsuX!c2Hnlb5U#OoCVc&zxv+?ZxDp%eum#` z)^A(8^SXTe6rQigKVMtFZ*NHV-GaLW;YB}wS8dw4dE4&M-6=eORS>j)-n@3tPQfhX z13uL^Z9e~kP0u`ZmsSuM>OW=LvT^N(lfV6YzaTuL$MeQ5D6sxR_j$bU1b)Z1Y}Cd^%|MJ84MVBOwekLMS@T*>FmyUhe>B@E>RZ^bY}twCa%Tri)&)hk%c8NeXmO%L(@>v? zMl519QtYhn5Hk<)vr1%Pd$onyOfBtk4>< z&2`7>0{+^#+a0g<2kK((^cSVSpR{yITTgykb756yqHk?m)10=lc+9hAcf6rIUYd+X zD=aokV7%C0N6qT|f!dhc9jnz```&1u91uj|$EW@-3RpLT5D;EVSp>nCZ?oW+LDtB$ zRt8LPA!ZPWAJZ_#um&O)3~L}s4k@I;8raWL#jRAyKTDMi6hewKy(j~P7P|nQz%CS-!du!LDrzpt z&o5~%3N@E{<>TYeFMnv=x`&pFGv51S_DNHT*IUwr-e4{-m#!DThq=rX+``6`!)O!) zquc1VTTzmy)o4}RFLap`;_Opi$}2>b3aA@H6Z#KB;lt2b zSTvHTX7;c>`<0D)b@8%TnbsrrtKa0~=|9|2QC(ee2MbMnQ~F(uy}JYbo*|@|CWZZy z!q&yF8BGoKb=6g+#ff+4uqH&spkPK|0buOo3s-w}$f|!^VM5YNL7_ECb0Bd#iXKhGLtO9T{ z)vVO!bJcKq8;02zqV!tobBuSNzJ;|J?2s_04fTyp&ZuNz<;=-{cCw^1+SI|?7qgd&pp>H1$dbv2DUI`pl@ zJ4arewLMzFI==7J)i!KM9t(vf)A)TqNWRE!NpGo%$_AO$rN32E#%?K!SsZhiYjYyb zx=Sk3W9;UVqC7eM3<}b36vZu$*ZxQu+**zX$w=GAGjft zsAUu_0VoD&_z3F=UF9lPj0q&-=XF*|4cK~}jOJ1oWL}QGRbsIelt4B`E2Bwe^;FWq zn2VZNB=*CP{a|1uFYNHtrRFy$`j77DZQpzUcB2>zEVqx{)-uE5cUemtQpM4MkMEk< zvH#0EP4tL;vaq(hI5M^^?ekTq5=Bk3>%0crn*Lo@XHi*M9(%^sxa{gpBRB3Ik`L!6 zzHMLJxZLG(7Wxh8b)JTWhgPk;=g@5ZC%whu;Y3SC$ebRt>=9p2v{ptfY_~34(?2-J5u8G?P%HEa%h-yPXYs<3q3%?3V{LUsSu8@-Rjc7#(2v!q!Kw*53Hv!A z=mfn%r>AeCNHdQ~WcDI(KbeU!Et6%FjCB}35kfmG*16iDJ~h^&F<7TV8`5PqU-PtW zH5yLY)g>WP6yo7fmC0%t!%(lY0m`%RSbkm z>NsdPVZBPjfhEL035^J)bifs2v2Nf>vaUnqn5AIRIckcpG_5$;J#cVYUEQ*S0|OV1 z)_v1c+z<@bC*1BteK6Qi>=ExW#X?_w|0Pr0_qcrN)ap-rdG)x*6X(^vnt}O8R@T+6 zJTiab)vJ=pRaY-;on7O0*UWBh909uW#B}9<~4Ok_iqzZ#=&PX4bJ19Te zIJ&nZ%$zP?b<`cG?TQ7Po7*DkU7gnrc>PD-+L(SpV{}+H&tBSc{;g|zF4(d#IDCEo z@Kqby-hZQMX?wV-mR(tY8HosxJ=iFhJ?5qIK#jP>A*m9F$3W6H#BD{~0DZ{_8==et zqBwveMClPB3jM;wO_eexM2lR30yW3d&x>YlMDPo`l*X0EjOEPb@CKRNrL{7J)Hm^; zI<3f38&>LMmu36VmhPgW?kz*xEiUtl4dR}c(z_ordkn4ueb4T{y!O_iLvO$K=iS}< z0;kjWP1`x%#&Xu>sHcx*!2(j zoX!G$_wGNx_V%GeZ@u=H-97pOm%(Fxh#lka8Ik(LpU7_rNns10&!mtn^zr#5`WvaK zC@+aci#!gy*`U{0FjtV}Xbx%S1T!N+u6&wGm{zJ3W2 zF>e)XXGu(>u7h=QE~)brF&bpCC&1W3S!)d1KihVvBkFWU9e1|gX)iMBz>$I{4q(!GIPsPEW1X0Ggu=OCw5~&dq#Ir=2 z5RpE@8ZNJf-C=vw9&QNR#pCRX^o8F|A7YnlK9%0|Sb77y<1uy{n$AuC58Ka*grKlG zr7iSnHKK~g4l83^Ngxbm%tZ67$cIy&SosPRD%JTU^C{=eXbDIYK!2KYgnu2!qNWb1 z2_#^yJJA?QG$$N^=J^ff4x`=}3KeRL>f`QPNCPXZZjaQAjcq6^wtDm~y(wDR5cHNb zqVF5n|0|A(&w&udQ(DqM(DxJ+!_Y!J2M?}^X7L~}iO>hJ6T#_kj@ zO=(G1;A1B(47wRXp>aD{NW{2F@yaQ6E2X4s<&*` z9ioSWQ+1-Nr>a5h)Zb3sEd}J4fFqSDt1hQ_Fi?kA6 ziv($pWWiq<{IL?}7IDCys@y7hBVLpIi?T}a3Zd@QTbjk-gCt+=Pvxo7lt#r4Uq*7m zJ2;QS8)!E=NF`9P1QwMEnT5nIdhX_GS2*_(q-oAgGF9j!gE7n{a^}Dwb~v~w%N$b$ z56$9v*FU#w*R#jw&OP?*u3gVvKkro4tPPC~>qjapN7gqqZkSai{`9HzUmsnz>`~@@ z>S^YoZ|T>b{>)1UYikd_^qI^jP1qM8j#tX}VGy58nH+YT)nYb)b7tlFs0oG>5tJR9 z4%kL~-dKdr!+rw64{TY(wJuuzkXn^X`!xGG^{iAcRW@A}jRunxov2HoNmIhA#l!ac zCROibNjs1k%Nv(|WG*zj!ur|liSIMb$v-?H4c9h)*{HW0&tv=Fw?Bb#EkqCNv6eN$ zqbVB`%1UApm(ykzYFJHHPp+(B8p(*!i9rGSG5C5NBo{P>5Zs1={Y18WSdw;8gTtNYI9LMnr%hz%M6_<<{eQ7q)mqFK#RjfzgY*=8j?e`d|ImU zTO8eRd|!9bT6h_|kjjN88T7 zW#!zfFWNgJ{Z)&#GJezif<`ZUym`}x%`NqF8Vg595@E@^I4X6i5#fVI%&T#2HFEvVCW;kV32P~%*(){57GyKirMub znL|+wikljtlY4{E%sa4Mu__I;I&n52Wdkh(OVDhP?-guv+Uc-%Itk$5T= zAdCM&i25291o|pGm5DHmDta0aUZrW7TG*A?P`On_5jYNGNSOkLS0GKl0ktr1*weHz zupweJjrdeCo1_g`$iSw_vc!@S;dNO0@}s_j%U>Ss^8L zoosE9_mK3-^n%b($@r%L94Isb+_XR@Ef@ZfvXz$=$6-Utci8mA6jZEiE0sl=l`u*6 zFkm7K!Z18a8d3~piJ^mJz9mZ%1bS$w8c;jF;~gSbXlci{oCyS)F)aXL*Jpuc0l0}| zq`E&;TT#UFM6;cszL07`*yqwl!xGSq+kClN%CS$;L^;msik)HUw>`7dyX)7@+x_6a z8S`%V_TJuu=Pi$oT`0$aDp(~!;z3G>G*$?w0rHGrP4e1n%L}L>+S3A=Txbwz;Ywu|Is#p^(A0P2XZ~lIGqm3JA{{!29>cQ4B_y&e(dt)ZTHz6x0qwt>_PK2! zH3176&ruyHiXD^Fj^3F;2btS$8Z#QUvURku1QPi!<`kPKHCc0|*cECyopr zzG7@^&w+b4Y`FJ8&)C*04i6rAVrTn`&d`y)dyj-VSG3QVU+4DK&uwa&+fd-Hn{S)3 z{f;%4JX~J!x!v=RZEb7YdTjpg&sCH^e94+Sw$FGr+OfE9|G|U%>lSxJ#XAz6^U6zy zS|X8_q0;hsowUk8^vi%VbNL$73ZGH-S|V29#a_d_Pwce-r`j+?07bCtFzqV4BC(VU zE9zd0Wa@%!YlyRfzE8AL>33zO5;i2n=ZTu=jY5r3ND>jfOWkRFY8A5>O=kw_VCS%K zld59+@X(GE9m6;5>K(Z3(d|1PKGfqapAk<#V(%&c6MNPkwA3A7)>!xQ#^%w^$e}$m zR;I#YSN+!8x2(PYlA)Q0Phk3YY;8!Fe)wOhn8lXZ{gS4G9)X2a{oVi8@2H|}^`U=k@ zUxREf@Em%4IQJ3yN0Y8rq5jh5R_set6()O*dPxe@uBi&t)ZbGTD)FyVH7vrzUC@td zPJULk%J6I zm7`L=%bWg`HyH>dz3e=%>*TBA&)8>9xWcBdo9sHB-Sng>>^i|dtI&n3*-cVfdI0#N z6OyUCjA2B;dSr2jyp@D2;0%O2B+n2c0e2ugkPU!Tr>muXC$FWy;>hD-{$sr2pV8lO z^w&=PwF>AjoN|p#aUz?=ak33D_n%$pWJMeLiaxuf{GU)qpY&MJ&#zNI)9W_?mMFwe z{aq>n{VEeW*t(RZt);fQv^W-VIx@aV+K<)KJHi!S0Vtqg8lq7dGcP$6$PDpensK|X zvU5L7GZ>Xs7siKamU$cP@yhAPhN)3w4%CsM5rjk7bHJ|77Na1O!bAe0G9&cCZOvRJ zbap`T$cX`{hankZ0E&}hnmB-XWZtUnsU_EMYOd&+Ju@kLzi4L_-6P!7&zC@KiP|Kc=zK@@sU zS+%wDCSifFo^_`}ixx6r}+pos;enU1pQ9CP8Jrh1!j`i+c1j@+$>KV zWl|n!r3BZVtO-Iumjx|!Nj-E(y&_%;d6Jk1j%G4|s2W8%C)L*iZs(Arqx6vu>?7=P+g-)K5_8mCMS;-al1U4W4-6O+m4KM zuIwxdv@Y5AiDk34C)e1l1u=KoaC3Oxjo&+P`G0?5<)*K^ech}pcdm%JECEwwOZv61 zJd%F#zb|gubi;`s>^#Qg|2ojQ>(;d1*HBYp9t=e~&Yx4&^mwX&prc~e){d5sZCl-6 zn(s+}JXIbn$u~5tIWqgQ7p~}8|G;Zkeg0qfF0=>YZewU!@8aD*XLa8^?|Tp5G}gBI z;Zt{=_vE#6?y{BkCYev$xMF`Q)ejm2olCw3a0bu~nTC4(2Saq52DGXJ#837dJl|C}!P?#J( zQkeVlS(t_48^cQJ{!f}r^p#^)45LaFdX%Hx9XoqTbwkgLe+M!7>`+#g5Y_6ieOtuR&{ zY%Zz@j^2{lG3#&DGH%IMCGfIL8%!i(pa}hPS}RHgwEzc({GB{&WvC*w*RqYcDxz5K zV5?INSQ>6GK?I2^Wyh0sjZj(3*(caL$NuZm8NtrAJ*;fzmCqkezs~H#8`}$msSW+< zw|;reu}iN0i+sFs!?9(_mGip2J*QUOu`4AWOfQYim|Iyr+~EKEhHbmn5X0+$57PwR zQz`r)gA1-W1{EPfIU8VE;#enRs=@dz0?5iBUH$3Vs- zra;ua?ksIZfFj*JM+1Uv2NK`*!5X1Q3ef^N0BVsIr7Hfp+t|?L+TH0>kFGucd1n8@-ES`*)fafYHAB0WZ2HoLeSQ1xTG6y@xF?+FVT53@eMZS$f-CP%C+)_>%weFvYutk2{t4H^(&M0_1MDc=m7GzkS{7x%cF zb^|O)SzR{AF3xrS3<4q`N8N7I+Qp&Qa_JZQh}2r5gJ-pigPK8%snd8IGBG*&-XY32 zk3EzA`{&1B7E3O=SFH_OG-~y!7Nw`S>r=JARnn z{7Vc2eP5?Hk1*tCdxj}M&&W&9M`TiB=?K^TCd* z!Y{$hms1BcfV!_3HOLBhdiQzf#lZNV(r;7O7yfemtJHI4@3v#_)(C&5=!23(xTvte zZq0*tM}WOPOYPbM;AoHvn2|{oRU~UgP<~jLX-u4vDxn70%4C1w$P~kjA_7p|#4Tq4 zp@Ddz;RfX_up9sg|HEGH`A}`SBLS8PwHM?b$n5EOU1O6SETbKfnHGcza2Cz?wg%Ay zklZF>2c)v)SG7Ol3$p)i+JDt;%RZa_$G5hPJ;yu`KFp-i+1^BcL8xcm#_sbTJlH++ z@Rwf*2beD4zGeKelD331v$<{0pTBkC!MM$t@H+;s{Knox&t2J{#TR)o-vftJmK>Ms zgoQX?<&8o@W;twBwN&{gKL^+t;eoQVfmy&}j@21ntU$@s!UG{=w<-m5Q2&z`r{5kQ zO~1{oaNt_S1LIdCGV&ARcC7JNfh^CWzmhO7>-$vpsR@V&9OhOu@>~)QTTn)?!e7OL z<^>4)pRiPUKp*6d#3rLIuxHbMXJk-Dt;DIf#Fz2aBRmL-=eAkQ#tg-a0JaY<2nu&l zrUc*=mYeYe5@!yh26vlbr!e3s)dZuQsHmD~U_av(;eV34`MXm1v_Z2s_KzofMJ0OsPj4kG61hGT2N5;tpX*BQ+VIh*$%a#X3%HgGI@0qRt8A z4LHs+#$agSjAn>cA^wlBj@{RpsB^IE3!2JaO&55}^1}@U>>q!tskWszyXvYIrQcy@ zX#ftje}xLh@AW54ri#e;@Vh2lBBoD;fKVlVRl)5?2R#1wtaEA?lF2Zo$**pjwP-DK?ps(<)%bv2X+}Q;b*q?Q?wpO-V`*TWdn`P>nU+ zr;*j<5E(O*>Lmzu(zg(nfCBhF?0i^(i^>#m)Kv+Gofi`xVW{Neg7w``W!S#Jy4JUW z{DWTLRD(T9v^_gMR^-TcI*j7G7{$?0nQPo6NpF5!J}w#TmXj^fo`AIDy-}A>dM?!I zI|*8c)#-sOI}U#M|8pEdR(n)fQ%3B{34oNxx$O1%^xMyljXle(pI0QXH##AKjolB0 zZU6makit4i3VZv79XnoN);sTH))#i{{C4_nNMlE4&OGweev-;aCKHMFXzsxbScF1F zf*~mYzsxdBxD)gTE<7v-S#`->i9JGlN~QiP9{aKWkQKO0o>O1tO$bRBDOhBp4v*s} z`HL1FFQ88qiHS;Nw3%qJs%|5k`tGcm~v9{?yYX`8len>mFrA(FZq!)Ot=9~!XIA|g1bm&|| zraQnqZWqgp)j_I-!sOs$ov4gSA?+r2TA+o1ZdRP37PSQ#RVR_=QZ?{%qdxFhiB-&z zP^LqJlHv3F*pA=T%nJQ1d0y)Wz=yRD-*#zjdZ#b?n#FPsv{3K@PTS+qK4QY>NLr6Y z{672wXClnVYIkun8uO{cYoHX+`HJk^<)DkslVvt4=0NY|i1WlvKfS86eBS<%WSoutJz8r||Hxii zvgf{$U4yY3KlOmvF#dh{c>DHSR}5Y@Ha9=eIR2X7$A0MZJe%lQ(X@RZ&?9#0E$ROS zF0~6UkhQg}grf1`V-&M{B?2k~>qz9Jec)e@S z+*HQ9iDA?B%QRHH-K`&}%~`zMig_y&I1A$z$ubDg&&2d|vq6sDjH<*Msl z-qF0E#ow~(z@Y=HT6!-1`hmVHFFdbowz0@r&^qV5;XQ}(=psDoyx_#HOI{w)-05)? zC5mA5EJ^m(B+6Ts93EZwrHcm(>t>c;YH^m#4h;N5tLK&_mISV?H*Bo-*;TxLbr)YhEkDeh)6B|^HiXO@Y74T|E+ zvoBm!$;=Dx_}$T?zq@?_GgmIW@Rj;iS1yp&o&4;jzrJ(XvO9l$DZbyi;L6nyeL#aD zb6$lp*o9>&JwnjTAY`hv>C|(X1-(%WS`abSzE3<71(KSdYyQOzsS3L{%+FS2+eY=NOF^2+$*@5sj^g(r`dZ*JMMRNC!Lyf;eyga2M1M*m8M zttnG!NvJ63w_9>7j^3C@PwE~*bh$i1>j-69?dPP&l7PvUBt?&Q=Qhkd$?dOGm7XBF zQujS1OYy@&EDBMBY>X^w`eU?O{||#zr*|5eAC|^B(JBM;d2BkX{vW!U$WPOq@1&pC znzi^p{VYZp_Mf~nG+b6T9Fo?06Z9)JyLg~TT3Zl4`EiUB!N%ey1>OOh2r_5vFe%L-{AgSH-8T z_VG8(1!nf^`1q`Gv)>_>ncRl7U=Q#yp86N?FN!g`5D%<(!CQp`4cQTzBy2|LdeBa? zLWa7s?wp6%Er6zIzRuIiGpow5TW~x{!9*?>V`U|G`knE&-;9=8n86#dn8RMCL%iPK z#Jcg9#5!qj#Fq|~&x$8zm9am0$gR&XLm**#x~WdR9MNf9k1 z==&r=9|s-bl_DJubUa%@(LZp|G3OaAju6e(Ay`?`0xKI4s`;S zj#K}GSYjt)i47D>j6P5-_3#NLmY4`LUS<}EPUFA>1Bqcwi6y3!cnVwhk5zQp#r`eD z!*=>wd@tx$7Pmn_vD;|#k}M1zRVAQQ ziZZdDmL8}}Mo7|WGJXxk&ymz<9`Oe9?z9%@^&aaThM@0h_OZJpL%yAb{dGQHvM~L7 zd%pM?bRPW>(!Y{irw*e3J^Z`_c2#DVQG|t+b{Faq(XsII;z zC%I0(aphfiVI5Ctjt9A-$&o!jJ?8 zLu!=9rgVuu_@O#1Tv$;lVDwbZ)gjn`yCQk965hzjLD^uzAx)2T-;QWWo~L+t?r2lj z_Bj>p$KH5o$$}Yk+vAZT-ZOw8P>r^*<;VmNkdFnlW)0|5c~n)--_z6bNPP@|360CkT;{ zudJ|)^b7JIiHf(4f)Hv+p9}^N#q5Rw3X2Q+06Vj)J~0Ot|6DD z6}u+l{jzVArhOw+4+%%(l=or}qp@o1PEKtM&WQ*Dh;l@9%th1`=izdjQiqBD)t#j& zoy5T)aVAHRRtc6wTIP(iHIfj8OH2fU#+ow_bAlWfJC-Y;FTZ`X_f6LrAqf z2-c|tT3_{U`)!*S9^Kf~vFDzR)w5Gg1x9V4fVI!sR$aEfm7>W4jkDyJ#vkpP)pz7u zhxa^x!#roCHrVI$Nb|ee()IPFWs5IgHhO3_2o4iEPrWVOrEv%qOiWqIN{{0qigvGRYa6VK zdxO^g(lwj6H?F?#&|uf$uV1j|!9J^}s?gygNakXwZa07mk6EPms zEtzxh*v0oGr>j~>Hz2Hp)?}1#I9EdoRyE~rX-)?fQ%iDcV`u<4(Lksy;r-OqI;ClL zJDss9cBFtE$+wdt2oNxVwp07L8euz0cq@Z=DkLVzkZQ%@+bJA@0cX>C{wU&8jUh(|l-PlY` zRbueHx<_z`_r+vc*&^CXbFjIwjO=+U4xGGTSazJ@72yqtY z+>-WHy%&25vIbNGY^FK^yaPkRaP)Aq(h8FQ>8kbO9N<9d zrX714&wKpp*}WG(cHsPjcJ?D*<9v;yWB-FY{BgJ8vp4x8ev?tzUPpg$)z&Ajnfvg; zoi&S6aoS^y&V-0xmA{Et{)f5GJ0OsMr@-YPn?cr!R&K>&fZUPINR2V4z+!$(3rZaH z4Iq0qT>ufP;+!TVOp+5OK{Yiv^aK5Zs#|69ekUhtqEI7~33j4>?nyABOVl`HkWAWf zA{7T!72}T*0s(IpX&?3z%L36`8`d9N*53|yaJZtcrhpmK zfNuw|fvLbyA8qt?(*r##Jfdxc?|CswbIm&YAi}V?hQY=nRSJy9oa% z$Wb&qT7s|2ePq5Moy-b#Low?WQ|wyS#77#WauPoCfy5jd*f-Sp77_}TlT}p0{^*~{9ueTr?4bu3u9 zzN#!)*tV*-Z$now{dQGvrFS|0cq{ufu0r1muTQr7T0ly~u1>7^6y|p#v_Ok0%ja;~->iwsK33nc{(0Dsb3#%hecRVR>DyZm)k1Sg@ z66>fWH5N;71e-tvUvmrJ<1ra-!R@d?TZhz>wbEi!Nz6qq2Sua=3s59yNR-%ylOy_b z>cUJ2vPmdM;vBEZPh=@FTrSjXOMo^46v*a{!Xw4UG%ko&b!J7`4JS704e# z>Q|1CMov9CMxnDGd3VMQYZqR&r1IS*OHw=QAbowiWoFCf>lcsj5kJ0ab8Fo=;)H~~ zn3NOp_px2Ph`fRI!sW=*;}>3-wO$l}?qFCHx?zUhlJ6(Z$5rPJH*e%t$czZq7pn3y zwnIL#K@3Cyicdh}3NF|t6kNPeNT`)y-=yj^E%ZU=4X*TJbWF8wW@7Ex(RZ2OSKb;9 zwUiYUl(mGyt>r$A_P$V)9))Uq=5EAr@!8I%ho(VZ7rdH=eWMUjMHMt!fK2;_{1x+q38Z@1J z!~c^TarwPA19hS%qBk;8h17=jw%Qv4kPSId48WO~12PGpK4;Ncheo3_iu95%9#0mT zr=7uH_v~AiG~`|3GFropC7Sr@(}{jxh5giu{S?G(!V`o~3Q_*>Z?#HQ z6nw~F1-QhK7;5@x1)$^Mssg|5ls!@O$MmyyBwGvF*y7&@N^I%(t-)aPyYfpXAGA1G z8_pM8?v9$RCEm2fmCvs5TGC~hHvD12P59?1en{|TP%aO?`zGuq#QiZ>e8;IiadWni z$I>XXVdc=sUx5bPwsID$&BTT}icY=<`oLR*K5FBndkKF_c~DXzRN%}&6qXfu_l(E{ zmbI*uP`nw^U_mZ1Lu3wUp?G63csnSQr3gkuiJRSNt$1wgl==Wpf{UW9Q^rIX%)YG^@vEhn-tzQvR_u-{{ic?euimw=nVB_VpIW|(O~-8G=0P^&0}A69)O zkUv99ku@fVs(!l0YAbB(nN_v+P*MKC;-ZZS$&zs&PB|g}H{R=YVD7yPOvl2n8OO-A1#_DG}MP zLI~P|vc-83H$KLI=$JT_4-tK(*`?qvwH`e`8_&wEI~{AuoFlHx1&Mvd>CL%0QDzo# z5MuJI*^BySEv=tmNSLO1q56bt3QGb{g6^rQ$GkXk`teIChZ`}7peRM|B4{g4=Hzoj z+KL~8B#Z+#K&m79jJe6!+|+qFV;yLcD*N&gfDGZtfr1(^adYSs50wz>iCXl^EPGPb ziHv6MLJ7Mn3npK;oG(KxP8V5n22pvVF_@vPax#l#OwP%+b6E-m?NCgzdT(elB*zTNc5;SVo1Pm3~;B=kc!Y zUpn)O=eS9%p*p=nbN5tx81_T@Vd+iaKp`w*SEoDyYG zi2W$s5O=F49eb$4-{SS0{OVMr4(A(^1Nh*9Wsc&?JpycUHVa8yoHo*y4jZ-55!~EF zN{-$MIsleRSz?IzQRr+ury^ik5NVL5qeN7*DP@Sul%ukgfr?!MXA1HFPvtgB6P1Ne z*CdzeXfU_*7M_r1_{3N6mip=5g3#ru3@Fo7u}XmZpVka%CEyV`dpl?rst%=YYQ>t7 z(V}il1Z8W}O)Ey~LXyjFtuLRoJ)sf(k&9Muk3QkBS{BV8zZ7pMgHNgiJS!9XQ<8{= zefe3NHO(E5{Ry5u_6N3!YzWWP*q`Z}P8goE4Y|J}#bbZY+2#Yp{!Fq9OoaY$!+$pR zNBnc1$L=U??5iGJSl&OnYP7$+am%gi8#b<-6KpXCz24Hs!RCt2QfGPp^3}`x%j?$O zxO(i%tx~Ja>?&||)P*Y}g`v{Ur5!_umM5K&s=`%vhcD=JM=JAURd`h1y{5Nw_oC#? z7R+@qV!{6?&k!Pv(fI^AS>&WtNoIH&BP_!Cp%pV;fzy0a2(eLQIg>;Ldf+#0Wg<|d z8IUGN7EQ#76T0$Mn$iXi5}Dzs-2*Zb*D6kDMMvSMQd~UHT(M>{_VX)l*y0L&p0X{AOS-@9saOP%BnRq1R#HiS_4V2PMgi1Kd<5Mz`M_dgRulz%L%MS|Ux)mHRk1 zPHOnXe_?mIr+Hisfw@2}M-Pyz5p$x1Se0jtI6U$zcRWzIa(^-$xKRTekd{dIygwm- z(qz>c3oQ3*WBJ<(W7_-7?mV5{e2bhYcryLucS4pY3|3idF+6E0c}kgx%Ejg7iz~&1 z%ZF+CQTe>m^2Jp&E$^o*#Cd_XK(H-1{%{3)NO6QAtf8My()oQ3o5ck6QjIq9x~(wG zf_d_YDup)!q1BZvnDm%XlrUb2dyD2i{8ReNY|Y;gQS~c>?HPnq{Z_QIx2^W{7wr){vp5}T-}wLd z9c*JPKmALDQvnB{KNMjE9^w3y-s7TNOdLl^a&uV_W0Q-d5C>^!LYXFy#N7_qCF zg`TED6OH&IQm(PkBp}g8W>DDXNTYok>aw?t(b(h9q}RS24C#Muv}q9|_mV#DeIfl9 zUm?3)derY2f5X@84>bBkqRZcZ2=BNa&I5IJk!Agk|$2*~k z5}QyH49GUcc6GL@)8!=45@I=F2yP%1RPhtHaYH}OdJsdWn+il-kZ0aTUbK zR(tizRjX@94vp4sH#<$*rL&qgu3k}{=xr*?GnO{@#;aGX-qo8Z6FeB$28DS_Wth#14M!`aGnN7D+JP64NYX0Ig&uESRJdS2)H;6T8 zQ`exUyDQa@tSWcHzA~`}MR0nNzmu}!VM}7>!D|tefp02Slad5JQ+u|myjRg|6TT7n z8c?1qn(A_-sO=Cj&DrH>Qj+BIbJwsJz?GJ<9$-0=?ueE>H_ZZ+w8mnsCDSYbEf~A4 zdKI7lWwqPPF3kT3pZ|DobEz?}tf@D_=YJOF-)Y`nJId#OWi>4v=4u@~rb$S4Xq5eQ zUOOL|Zjt$45BpgmD}*nSl4;0bS1?#X>8B0FMG}1BkxMAzqz%|ilub*43m9uMW2`3| zNHk-x7ysJa@tx9HI|mxpE*S~sd>5}C=$dtCS&cvJ&wjx=;?9cn!#L3GKs;GMI7B!x z<<1JiltKt~L|Z`+AVe!zLoyrCMioDZ)bmA!Szw~FL_{q@yO2Z%q7su3EYl)G3!HRf zDoH1$*pyU1@A6wD(rj1 zLlic5-i9g9r9E0)R(gK(?g#eHy?FhgZ+)mB9&pCXli|&q*saAy=?81ehX%zVtG_t^ zWLKo4+W$@Q-bn2mtG;;gQ0dIoO`W!|C+@Rcb>Pi)`6b`#-dthd;z$%ZZ`TJZ+e;aI zDWb4lcv0ii>_dN>giojP=$;?H4>UrRmRhV96B4saLYP9f+{oQ8;`pM(0%ph={vxl4 zT+W~y5E%FlR56xJda0fd&=#TqF-z=GfWT&l!G>Ug>bjb`yxQ8o5S6H$N>bxb@J@TmD$ms*&eRZ1fTiGPO}VuZcB(^cXp*|!cyp&(;f;ZErik#uoMLUQ{^dHP( z$oAb3zJj^ZyMGX^F#XzB{uk3-vzl;jLN?F|3n%5;QarUF>R5iD5@CfZ3o3!z;oL_c_$1${ zRj4LtIw1_C2GRo|Igspd@|Wp%Pri(nc=xJPS4nrtj|hXpGT^(VzptjMyfhM;WYuXJ zWK3Q%r=tLzGNEKN6^KGi9PGl&Ce?3l>$i)~>r@_1Hr#2tNmD%$HReEBW#+rOu|QamEx!q4FLP01@r_Y&DKBgDC(fnjHG z=ckWME>sq!GNLx9!$mVCf__RM0WK)u@vSP&Wfo6y(qCAc@OTonh5lr*hwbwul73vR zg=;_R{QhLZBb)rn1zY|Ae&H$Z>*5z~slS0oIH-8)@A7-#S>-~%u$sM>@{BH>J<^@3 zucLfh1<(uhU;_M(7|O`j?}E`5VnbWRaYe1v8b-Lvm$bGe#4rpKL3qP zo1XgoRcjjP`%{}XeS^MVwep_dTzv8GKEJAb_Kqv>ShVQ&E4R%q!>I}VlK$cTLtk9K z>HZ6QhuW6uZLWM*@!*!O-Yxxco5%A?E~Jf5-J?Lg=Np?Y`{TW9*4+EY%a+`Abl1F! zig~+^-i2wNCv}P2<*(zMUW4#|DNlJ>byZnIc|)9{33AVAP?outFuX98#NOES=QO~8 zu!#{2%4G+Yk}5t-!lcw00H|jpvPUZbNZ_zY3z&eT9@$N-z}cm=6I zXFFYyaUYVyNI6|0ZeNh^*PHSysv5#&y|smrg~!gXu8dSff^MfzSJZsvYzm}L|2)we zY#XU`#HB&AH|7eu@;v38rQyEjxKz+sX>s6gm6l|6tZQj~`t8ENJkjDVw1p7;23nRqUBJyE2Fn&>s6_XG2P&&7YK`gQy^ER}k(>(QWW;Y$)nK zNE_5kV%$goK|)`{86I=K&Lt6~*!=PMazukwDffs7|K5Eank+3Z#7!}S!eaK_l&`*? z?)<7BtRLv@ZfR<4AWJJ*+PEx7W9dNZdp!%n^{f+dih<7Qz<$nYkshI&8X^)Dv`#Dv z0|g;hd;J%z>&Y*# zSc^j%kGxdrxFN5gplMmMJ8m(B+p5kJfBGRv?T^w=N|#=FXxSA-=3-y^2VthOSZ}pQ z>Ow`;MOGk{OY^iiCa-`b^1<(@afyq^@0VA6miAqfWEJ0#ALp{yf+?~WVS^WSrfPL| zZdV}@{H!{gB7#q`rQ|R?F4#6TtUNq8c=4*n##I*&4jx|F@PMznGagS>)8&5gcxSaw zv%de(iiU<2hx+?2TG`mR@}eF*EiA;-L|2X9U(?0u$8upV?lpP^x#g_FND9$yWKW)) zX%6;-R23vFNQ{b70fT`+S;`gB-J0iDEHep`N%Mrmb z`92izD{k`Pa!f|~#T7NA(AA&4Hjz`3OlV+4Na+L74AlFK;nB)dGO0J4;G)LdyEBk@ z1X=r6wJz@r6_hpxF7Y>dFZCCV|H*9ov8TjuM?%aJv$4P{8+GgLH)(f8TIW=i_I9)e zFVh=>1zTI}3ENAa+S*!gtTJ5Wa3Fcnp6yr@CJadzi5oBv?ZQ{+K9i;fQ88fPa|B zCW*+1Kg{EQi-aP-PxTPS#lUNVm=9L>_4brRKCy4J=dNl4-#& zJdJShP%yEz$ODKCSvRFqN_DCSivZcL61)vw1>-A)v~u@!CNB3h2X&&DQk6rXL^yYj zpSoy9M^B<{P28wESl=?qSG}O9ywDU2SF9?1tD#Qw8rCX&s#>Ny1D(QVzE;RxJLz6G zWnN%rMqS*!1U$#OVGIye7 zJU_G#fp&Z!(uZ=V+7$k=oXm9@!&?bA*DZkY4!PZ7yz8OQ9>BnRj->Aq^WeoV6yBs< zEnc@7=1cN-aN9dcZee6j5X1sTm`IYRSOVRg@CzpZBnf6F@+}z8S<$0Zq;RXyWQaJ@ zp93&ckM=-Jtw)z(p%0W2MmZ&)c{%C=$12ZMjT0-P_DXg7P-54xDqawLp1TJ}1d`lB zn#obv_?XV>^xDGVf#J&AT+0TcsnN#L{-{^`Cmc>Ha0CkSZtC+4C&P^ix5+p{zBpku z_}EEjZpyeone`m{S)xD}X52q=JRtLRNly9X#Z< zV7h_PRKRr8;WHWn`VW&`6B)$8lbR5=?GE34RGwvXSo7tkzkX^@dY<$Twk6qaGUYk`0a&{oFuccICi< z#nsh|4-5=lu(+mX@dZOYU0pr>U0w3y74tqeIJAF3Ma6>sLxUfiSCMuvTDENA!ez@A zDPy<+`rF(I{VndY3(()<{Qk>M*4Tvkz{QxIxFNtfO&Qa1_048;SV(<-Res3MDC&$bbDI#mOdAd>50f`Hb5m9Zk4f+G{;<(UN_GtU4-fZLd4y>kL1pvY&R8p;Jk z`7VI#YL7k~FtQc_hj0!ib3vk0xu44&Z9u{ux}PgP75^CwyHb*U$Jdq^le)bfm0Jr| zIczg-O8-8;5U#p8UwVJj)WFG`fZzjvwGb@$zF+X(yVoZOvrO7J!Z z)30N#CBD|@^R;di`q{x$(3sahv#+Td>yka2~iJ zR6}aZtT)p8N;sdXtUK;5Ro0y{2xI@L%RUj^k7ZYrXbemRnX~j~hl=-u{%|w`2B>!s z%=8LUpyZ)Yny%6)yEJolHUO#8VouX;&{~7ITytO*Jgfu!7+RiXdfNGFwb_g29+) zH00GG%Ye~f!Zi*FAy3eYd2~t^ZrLnh5zJ;1B5XJ-On$Tp+5k+;%Ls_;{{ye#(9LE@ zf-xJ8!*O4;N`~+%BVI+cY{N9KVmdT4*G(N6zzAlG&P+o)*B~c`1%%HlOl|vjU!&D? zs(6Mu&AyHkMdMU_J&lfiH1$cLb>Ex7V9#V)ce3(>>sNVRRlkyUpMfHZ-}_*SSEx`` zyiPh*vI)7PCjB|7UgM-YcyN2f>38sutcUAuARQsF15|;oZl{^M zPL}j~T;!Wj&w@kYof-`z)ki1pwwW{eZkuj?w~Z}oOV6Krxy|>34W-_y#TU*V85^#z zst()r`s?X#8$^T`Nq;!~Zkto52rcDnw5M>p2+fjCc$pm#glWouHL3j7 zZ2e!et8?oAHCz7M+;UxBw)~Yz<@2-UzhT$l{o<+rfi>d)pldl0VfvGl3;umY5>hV! zP%>1JJcJ}Df{s>S5Ghq6wzVF&SL&feCHP1%Ae|00N;y&tBQl-dP@`0k1cf(-B?@$b znoI{~qA5;U02O9@uvQaSAb@<~#dM}QgAgoCmsrtXDd(CM`(FMe+BV+V_p@Q;Tg;yXHsAEeUKx`sKnfUAH2BBRNVP??~Un?+h8x>`&!0 zp|`uWr6EZfd4qnh8=Bbw8_0S|hYO%MHQ`Q|Hj@$eaLr`6iiqwI!G#1`*^dUn=hx_Ot9g{$M6p&`D?MDYWxtAG`G*oA2LUs6*bf5#Q z4qOAYoNQ4LISA)r3CLhPa7mSL=6n>$6hsG5@u{y+VgyKc=Sml9u2r^?!Ye*FW_Kl;6SOE9I|HIYf>I@bNdnH*G>#xF_WZk{Kc2 zi`%j-bX7eReCPngHF3)YZ2gjslqHInCutsQ%VXj)n4gnW0*|0~@U#Jw+UY1)P{v|Q zxmV6q4Jn2Qchu_Cij1|2Es9@(4mqZhbaxevKI1UEy*Ocm?NF=TlQ@}=los* zKIb^+$Yq|NOaujoUf5m{tA_2ipGTRY6>)4;5pN! zGzJ-WR2oE`ffXBAlYwar=_lEu%hL~}zjQfUoPOdm*3WvS|4BcYe&ABJApNCF*<#jz zS^5dq2Uy5Hdg?~pt?())w@PSXj+CXbzPvOPge?~LyJX|^o5BSMqD$756l-LSMUQj3 zFePA*Q$l{E#>gdhbV?3O$`AFalJd08VVC6gNZcfsLo25?CwkT}-P{anqOciGt6D_49toNG z*}u$H5F5WTdn7O~G4|Y^i^u3fi0#kLZ!>!ef}U%?x@Fh<%UYYoSzE57t0AOMR#%RH zWAz0&*F%(*Y%K{f(*_nf!7quZtC{ccS#|%|kbeF6o=3Z-vd)>fEn@S1sgr-K0-_QP zpxoyiADc7ycrC}TspY?7x#fh9O8sB6TPNysyi>|wQOcFP&>a2@4*yrI8=n*RRM>Dn z;12R^1PYyYP!MDbrBfZ*Olo1&%^VNUxm-Y@8k6!FK?jA z&8f{Wb7-ZiA{CQc(F@?(fXV=Wtc-J;s{527dIOuId2)5^Xas;Uy8bWQjI?3e7HUiG zcvZKBV*DZ{RJqUav~X8ky{cZns^zIjaQF2$K6ZRdO>tXqTXEgc(xJM}^RJ&PoA`Ak^6X#VJe(OJWNy`AmNjmg?7+%%od6WPOhY{Y%J64KQs>frMgCCb4_W?ckB z=%IL#s|SfA%}kpItmCO8ttL?ikrc`Ikn0+GS`g4c)RG_iM_yL4!+Lm?*-wUZE@jmGQ`O;&o|0PrSt63zvlnM^rz07)YE*O}jC$`}Y&oa0?q zX3_~JY!*JrIz7|?A(6WZ=NQlRn65Sd{yU7sNuz=hHyH9yb=v4NOj-x|T(+F?J$WKL zfpu`js>4aZMy%5tXfOiHBXo*lP`GLs=!GKjtnV`xrndgaUS-tCd`J__-e?5RMmRrx zgvr=Re{!9FQc+;V^VCd$J-ySH{xM~wY! z>mD(kWv7z+tN5v=S>W5>u>$onodo0^H@==2)VlF z&09Kac**!T;l5O`b3-3{_KFK?SM*cz58!cU`W}h$HTSW5DTb%3v#ut`YSYL1 zcnlBu(|bshYpypLVRh_*qKZ8^)nr3CN^?v$t|A6;59kbQjZSAHeNf3;^6!H3D488} zAG{G16GV+Po%1E=E@&-fQ6xS^od=OqZjx4F3~<{G<%jKr^#jN3C@dC+5PqCo4SFDq zLM@#WS}+bfXHF=I?6SPjaHzkyAgm8;d~(5wTAb>i*RrBJ+H=`67j5~GL$=6pU58eEg z&7b_=yBGExeq_&zTUSuMJz>E%0g#@cz!o51oYrkIo2Q(6@dmshq&Qmy3_v@l1iresa_fT)Ho>$O=WZG z$Z}CL9a(NJq9e;we~a%w#=bel=`y}_N&$_b{M1)9qneEn0Lq1WR+w^BR#eni*3$`H zI0^A$Mic^biWdm6COReWdoleN|U!Jp22z zOr8g|@eP24!KAg|+`-v8p4(8-=_epeQtBschFq=BBw6NXR!OU8F0RpQdA7|EK zeUv1&&$Lw!&0r@Vpz ze|2&A$9>OUK*=Day4uN)k-*>rbGJB*7^78h}- zD0kYs!H|(?0)jE=$Jpd#hMd}%G;+#w%dZZ}dH1yG3MVqvZs43n&?m$$i4c*hRD?Pu;#Q(heUrB z93k9MaAb_*NG3-v>jP5=T_6!8{$VnrBJPk(+yo5iB;y9&)yHxFoqFP8I2- zmE_UD%brtj>kAP(jk`hFA5yTFlT?deIK4(08dO&vR0q%EV28g7GL96h+&8a3}^1owR}x35o^v4Ju`(TlB&6;VWtz8SIt64g82E zBTK8Inl(sd)X%wTS6?`OF?%nq6)!z`!;;rOann0rUcLIu@7#3b8%v7*zuMjezUuS5 z^ZiRmLL4}NWQ-l-MIaU%1je##5XcCdO$HJRVH+?+0WV2xM5G*pZ51h#YPD%@>ric1 zHi)vDB{>Em2(b;al@8jM+uFIgzOCCy`^ik(OefQ(b33We{C-~vj9sVO^ctU^-t(US zd7t;$-t#Wc|M@R`uIVdVo1e?hey(}zSDKz%n0WO4;q&ev6h2q{qqvbL?mqXGAN<4I z7cbT3<<(w#@x@Cud3iOLuxiael3vwXYJQLttcbs9>GUNJWZuKx-ijqF7T$kPPG(NV zY(-Zp#-68l%#WKt{_3vGgY)7-$x8V*YVz==%*bYpqIKd%X*)(60%PKbpIeZmpImLl zj2o?F_E)WO)W+39SyqSx;969YIAj4?4RtR zo_ELo$vE8;nBW5^6-JM!$A7QCk$5<*kU}Grh{3D3;pdiUiy`j%`M35IuFFAuZByZY zd}>o+Vg3X2Z@MKlk3EH=w;#x9|Mpi;maSM>{{3gmez4ujVlR+E<<^x|+xM=&ATKBijXWu|H3EHNHvbdntbY-DjUIDxMXg zBuo9&^Y4ahRri_a-`yR@BR7Xr(cExveAAITZg^JPG5UXd@{|cD|LkW8ucm$_F*JH~ zDDf*A!gRw|e6Tg)>G(Sm|EKOPxI?*wLbu;~^JL#)Kn@ck{_TY$H+CpCP``{0h*FoP zYqwv2bnoe!s3ROc@1{5X+$)*T)PJ^#;giG9%*GdR%g69THMUNFAU|Vn!IBv>mK4m* z$bVpZ&D|My&Yyp0#@&f?=dHc}_S^4YJ8$ml`)<4KzSVPQ-h1!N+4tNdzllpY9RKaa z-_!jJzxdo7PHUoHQpa!6$gPE)7kIt{+N^p1f2{kyCb~&i=uXv7uHa1d+Ktk>$^zJ| ztEMVm&Bs>WvcImqks*KNLJtCWUcJ!w-TUEt`hvANO#hSXwJ^Q+b1s!Otb}VfU-ND2 zgC?%s)bQ)lO~swKeOkjE_pg~deaZcIPr7aD|9Qv4H5t=$@1K|W$kaItH$RxJptAJY zDoj^FniH`@(tlt4_w|$UFTY>%(5N}T`os9|e}ClriGTgC{eI#X|NiXA_n#a!7*~^Y zvm(cIzN%$|?$K6U|NRTNO*?5cyM$hHk3PEmnXO+8B_}6_Z@YQop*KwkZZN8(a%V9M7tV zH$IRY;)jsKJ%R35zx@lk74z51;--J0h}!<;GF$X(g&7}6mhnGAmh|lliXm3tevLe5 z{7c0g_b301;AhUaMiKm?Pf6~&4`jpY-^U-u{|KG@|J%RMDDb*&{8Rml3w|f~y-|Os zqsSWq<@_7D$7^`=biB4yWmH~1jgR{z=by&_IhQ}s#~O%-bN+p15dEDMFYJHfi32aJ zSnydU)M*5-}FZ93DzzgwFl z{j~i5-P#=Kr)RUPf4w}VpKJTRzecjxq^TA)@m&AE*I39mN;rGXu!{WWlS$_d_YOZD zMLSkbOXG)34X2_@nsno>aXe1!llkbiL^re2@4I(q)_pl~3({v)-}LmWZQFnA_m^!5 zO`bIVrdy}oy)@&6gK2TUoRRjirmAtrXWa4e@mpJ7$lI`B#^kXn$=g@{_;+^waL>ln z|FAPIZs({2zwx6zYqoDL9Gf!n=38%`cyRyPn`SAZV%*JR*W5Jg)El$r&l(+ivgr9o zUhVnTD`RgSr;p?*lHtqo%gHnHulYS!;*ekM(axv8ul=ZmDTzZtTJT?&PEw0$!AR;h zd?V>vOxoO(iJmHITgR?3GHLXqdlc8BMX_&X9Dj!r5)#4fmA}k*md%CRLh%`JsSxE}aIva@U+L2$)rA@c8so z{zguSc+8)+N=6>^x8z%wD`#&^OOBs6ZCmBK^!T#B`?zxCQGZhlfA585V?y7)Y0R`` z&n)}GuSSo0n8*E%$aG<1hmOzFm-;zFx^LXs@NRaXykh-EYuwX#TupT zDCto{rc|b`%^s$7{g>i>jfO?dtv~rbce(1}-S9D-X;zzX*F_{=qxlIPw{dN9`x!m> zIpaKJLfIhi)h*UMaPi*f4i;}dwC=ZldEYbXB`^HrIo!{ph{% zH>ReJ{rH2V*r+iR$92UehLV3GZN$g^Bq@mBH#(%>^jSg1r}Bg>{U>sZOWxm23di?fR(iDxOTFQEjGV;)Nx63Wd*DYEX z+#7%DhZClceI`La^2v$MjGaE=hrjq`QaCwzS-hTEoiu7$a`OLUI`KhC;s@~)M;EYe z)l=24TeoT<_RlR@E#l8il&)WGmP}i?`mQ-^7fqYCXziT4Rxh0P!qwGg((le$sZ4j7 zE9cB!kvU~b=8D;~GBan*oCZgMs`TOTzqpFHKZ<{MR7Jw~5-%qONm)r>Px|@jnWL*lA5Kn4&P+Zv z=H@YPg_?B#;#=c3j*EsP++)I zFDUY;PtvS3Vy5_AlSJwQ&nvcGe^vI$|Rz6bjNZ}*TJ@UdM6_5P(BhC3+ z^NaFd%CE|QHUIVe!>w7Q`2fFSw;(=K75F3)e>;J@xplk8gRrYr{7-{Pu?L zZTQK?q>Y&yzrAr_Q`)A&O*Naox9O*wAK(1Kmb5J&eL3{yC%#oWBjeFnT~WLD%mVmhktF=Y2c&$j6PzKbLoEAeGMfFJYzb`5XB!u0k$6 z7z~bD8&oE|9L&;dMbgUPfyBCCY21fFW&FnAIlb15N(8OW*KW{jt6pEyt0F!%_@-Yf|CU}a>-A@&9u8(C?Fg17en)pj z-4yIid>~ko_(8BYp;WJ@^!}*c|18)WzcV;H>bYQM;?Cf;gix?|^m2Ws`lQ@oS;C(N zulaA{?fUE<-9mjdxH&Nz{HEGWNS+&vOZ<{vx5fUygrQ)G_;`L)IQCQXBl^EFN;9VT zZ^dE>HwEhwb_TVhE(W>!`#{3nAUFPP@!_l@-wdiWW!f2kOYHX(9tmnyu1l&5s$8$v z0}0#pSKk?RPf(>k&K{K{8GbV;PMD)HXkIWnVPSBy%A-e}43>%RZF=?S^|0tac~$l* z@7Bw*|At;;ea)y}1cmC`-zVLzBsdq8uds(}UbgJ1`&KY%l(HS``pxmp+K+DzR>yx! zIdw!ku{4+(f4AztrM@>S4@R>3*Au*&_-e40*LRgS>)~KNa<}Y1^BTQ2_EYNuJy;hb zulSv@{nEv6>hGXlA0^EV?z^f7>)`sA`t=-ou`aHESr^h-!Y_j;a<}Y1^GbSN{8|^% z!}YKD+hZSC{`&ilUPB2b!9&;dU|n4Ql3etDj^**Gmvn*7^w(`AKd*lOVeo)t{pXU` zR=whM{UPc2kZk-(y&m^#)OhXrjOXv;;_Y|hD}vp6y&C@?V~^rL=XmZ_7xdr%Tft`2)Ha-_H-WuDSa4ou&C}gR~&{pYchnKmLulS4X$SozUCg z_2-HsIjTQtc)q>gQ-euDj~tWqn{YsXr|Wa4F!8M8TR|-Dp1Ae#zaRgT_z%-2rQMQt zd)lSZ+vFc+-RIC z(xR91qX{#gh$gJqym4y!)G2#5rbYAfH%^T%-83aFy3nPCn>M9I$E?`)w5RD)RZ5G_ zcVWJ-xSYQ+?W<{f_H0XwhVnOVRgI20r$$3A-S5)PQz~q!@FlW=I5!xaipAj9M z{!lbYufVTm(WGVTHbzG;n{!6|EZh1}bn-K|>bg-G`YcT(<5xTtja%{L*5z}f30Lca zIq7dECCu2Gwqj5EHZue5V2b+}O`9Sfu2PJSnvuS3xxSm25sllLCVrN!wj5MQe`r%Q z6JhNwBdRkh} z9<_4AC!eOxn5pRmu(YWc~1JuZ40NQtDTkBN%At< zQWL{XiGplYZzPO4(L@`AzpL-bUu3vyeUwmsG9`WLrcYXwN+y||G|@<$Il@kQj<~#$ z>S%KML;7rGx&$^ynw=Y+4EO3;{D^FVM>oz(%aKP9+sajed?LK08S2c#`gB_~ZpBmS zPY%0R`iMN$ow?DQMu;uDD$uPSK*YdRnctj|o;J^%uaxuTY?}Axn7BzY)-PPEmfSz7 zzU5jqS6}_=r>>bIk~a?9ft*izzhPcXzJhF!8@J>B=#sqDbSN$+jK8nPeN+!zkS@q<(dl= zE)C))oYm5K>^xEc#~##7WI}9?aAItOFokj|_35$qRWqIPOv&m)_}F(%it?~w+^fa z8^A`e32X*i=;uLtcnCZU9s!Sn$H3#@8}#-BcoIAXo(9i=t>8JZ4LlEC055{?LA`_W z6}amJdysiQI6%!HI3x@OW5itu9finIdhM$`5>nIdhN1?zv3I*0tD6oz~fpruLtfNq19fbnxC=^&np};x{ z1=dk0u#Q53brcG$qflTSg#zm+6j(>0z&Z*A)=?<1jzWQT6bh`PP+%Q}0_!LgSVy72 zItm5WQ7EvELV$`5>nIdhN1?zv3I*0tD6oz~fps)iTKKVWCO8|+1hc@E zu@Cj>DliW$03QXnb4>~O3Rnl$gAHIK*aS9%Z}8m{;7RZlcp5wdwu0xtHt;-n0lWyl zM{6A_hq1IUmKMg+!dO}uOABLZVJt0-rG>GyFqRg^(!y9;7)uLdX<;lajHQLKv@n(y z#?r!AS{O?UV`*V5EsUjwv9vIj7RJ)TSXvlM3u9?vEG>+sg|W0SmKMg+!dO}uOABLZ zVJt0-rG>GyFqRg^(!y9;7)uLdX<;lajHQLKv@n(y#?r!AS{O?UV`*V5EsUjwv9vIj z7RJ)TSXvlM3u9?vEG>+sg|W0SmKMg+!dO}uOABLZ6M{rp;DjIqhQW!kGS#HVdW18< z*Lb*bQd35` zoboGtS_jsH4PYbK1U7>$P`?DNcJMvwuh32>*hS0TU@zDQ4)Ez9I3%1XnQRb_iM=fh zQ4WI>_%sDf<ORqEPrCKSYyaU$z-eWf!KgBmrsjmCjyp%6|_(ZR)N)E z4Ok1l47Si(7vJgzd+13osQMR)VX*Jn-SzpQ?U!>;+*yEw2L$_;fwxM=3u>`SDntuH2yA zpwwU^HJf5TQhBrNAyry%`OC2*!tKy4f}kTIyZ~MVf5??@fp3HFfR~V7JNPa&@6pc=zI6pTbb?(-rW@?RLV79p zf&J7BaOEI4Bvfdhe)rR5Z@t10<#GCDOqV~peu6AHUG`>7<(lc>g4h|=WUD9X8bkh6 zm=n`BfyR)_!d&W?(#}?}h}I%t8CXF(m0%TE4c36Q;LBhOEqC#)Zm@^`^iu8v`&Fak zbIr9hdjiAYL|NeUU|OtQn6B2QYg94L2IngG#dLXuYqG!vu^lQeq_u2W&UB41&BC16 zYGE!ln`Ft;W!1**e5(jrJD^nzmQWv|erN1{UAYS^<}9bhq73YLRc zz)o-g90Z4iv#_XHSkx>mYF1#2nuSHp!lGtjQ5vh%!&w@sjJBv*Skx>mY8DnX3yYeC zMa>FqQL_SD)GUqX?+a~FvovlSZBer{M>5)?W@(OOv_;L*9LZ>lnxzptDzrt-(wJptVY{3akcez*_KS@C{lx0iFa;fv3SU;91&irF;%- z1J8pOz>DAyx$-UWZSWoNU9f{|dXPiEaIWOjBb*TH6Q+Qv)Jz8}z)G+RtOjeqTJUAC zhwt_a=gIco5vFTYnI~^G&IU8VEO2G)4^_Vk%mW|Rm@`lFYS%vsZjcwu(|q8(@Ci|w zC!ckBJ1y*hN-mFLrr0a`^a%j)F5o`jR!4`V^2K_k!o&-;Ur@=E| zD|ilU1J8pOz>DA|xM&C8qx}x*uh6Sbu#0|ngFVQ(mvSH2Pt5>V4uV5M?L290QN*T3 zp-jd`?MTq%3LSN3Df0}H@M!3wUg1gpSmum-FJUj`4-+9B{T zcmzBO9s`eqZ_x4y@FaK&JPn=!TfuW+8+abP0A2(;z#h2k7iOWsEHs#f2D8v$78=Y# zgIQ=W3k_zW!7MbGg$A?GU=|w8LW5aoFbfT4p}{OPn1u$j&|nrC%tC`%XfO*6W}(3> zG?;}3v(R7`8q7k2S!gf|4Q8RiEHrqZ#)JXo{F@2R1~b7daDhhD`!pBo6>g`d1bhXo z1M9&Cun}wmo59!k?(5(_a6kB-K3yOg?hyL7b%Dk!qkmx+@C&;jxJ|3b1^R_GrfY7n zfM3`J>aEMO!MU-8DrZv80++|esb*zN5|_Oh^T5@yH7e)R+B&d+`t_6_rTiG>$74Hn zY>vIC`YqIaIrg&3+o8CFnqshoniu(QDK+Jwf6W(2cSir3FOcqx{xx49 z-5LFBzCf!^b5{q}gAHIK*aS9%2jTP(co;ka9tDqq$H6z??gV%eJO!Qx&wyv?b1UU@ zU>kTIyZ~MVf5??@fp3HFfS2I39ekIX_vmK_-?~D5C+PXZ0$HGO02~B|gbQUAJwneY z7BZt)D0^^?XA}$N1xC*(7D|#v&nOm3l19%c7D|#v&nOm(N}u-Tyr#}p%NvAVQ)jcL z&K8v%mA$6U7A=>(rp}h_?Gt)Uovny6%}Ql~SA zI-50hwk*(Puc@;Guc@G|cHlL2w&pD^drh4kcuk$nnmU^`b+%?Q zKT?g?)Y+`5vsqJT%MMM~YwB#x*v*UA)Y;nKaJ|>m*@4&8*{rFv1FxyGwd3Jyyr#|$ zyr$09zK3hPrp}gxjb2k{OTtF4sk0?vqu12gvQ@Y5HFdUjNQ_=nXKRPV=rwh=c1Vm~ zQ)g?B(dadGw)Pl}UQ=glkJ0Egb++~xjb2k{Ymd?BHFdW37>!<2X9r$WXKSa?Wv{8T zwbN+ynmSuMjYhAjvjeZGvjeZGvjeZGvjeZGv$a?ABca#S*@4&8+1jyjKfR{T*1nD9 z;5Bu2;5Bu2;5Bu&EXo$*HFb92HFdVE%Qaq8XKN3~=r#2s>}`?kZI8;fw?)|7BH3HH z$`iHown+Boaw^wMQ@qI{S(mS$8~d(sxq7uoR`h{z6_^LE*8cn=*^KKS1s{)ft8DEr zlJ?zlF=)LnlHQHGz*6dWQ?|wzN#nl00=ku86<7_{fVJSu;6ZwI2s{iP0gr;mz~kT> z^z8(A5h-(J8au6I6 zE|$#S5qeFrSpIADnqsj$*XT9HVoCcCg8v& ztSJ_=rdTZbn~K*Ii{*W8(`$;wlC#lkipBC5qt_IRVzKPp{q&k*u`Jvzdrh%e7ViFdO|e+A zGI~w1Sl0WFPA_!wDIBBygdAC~%VBVW)&)6|`;dDOr ziX%tTHv0EEM>2QW>y8}Rd9iRMZLR|Iz|~rheo|#l=5SgACK+QH5(~! zioLG#6Y`N9jgv14w@~BtNRE8OyzJn+#h}+CIT|5dzf->!Ir0?ai?mkCHM^-PXnBhruJ@QScae9DIX5 zoB&UPr@+(T8SpIqZ>4+=Yy;1O7r=|)54rL!@NMuN@Dg%s2j8W}>!2LjkF|dV>;$`z zOgGqrRd_coNB(H+r)GdF2f-oX1G1vaLR-rNvX*|~OmH@s31)#SWB*B?t^)JG0`O7r z@z`JK(@n8I5^e#v^Q|4UUksK|Q%boUe1)1iupVpx8^I>98GHjOC%}{7DeyFS25be- zfoBvj6PjmqLIhw z)72#!d5k_?U80f4=+o6D8hMO9U0tG)$LQ15C9;+ebq?xX*<5yIbG1rx*}Jm2?8@ef z$6l4aE1N4Gjoy{b6{jwHS2kCxryWA?%I0bfwL$1z*<7umRtvo=n=2bQBJ{3ou6Xyi zyepe4e>W}f%H~QMuJ^8NZs1+nTy|x1HA?$a@5<(CwdGH}E1N61`Fiil=1Oix@5<&% zZbt9Q=1Oix@5<%|-j&S_yepdH}yPe z+-T}~(uJ=y^*l-5HKv{?$s0}mVf_Lw6^6htI3ZT0niQ~znh3Zvcv|(lz};XO^<7{$ z*u%GaDffZ>s#$|J*PzWc;;vOS*5(?txdv^nQU6_UZLX2U8m-MWvQ?wCxkeoMTh`_p zapW3nbB#DMTAN?eSkWO|1?GVT;G^Ih;0f>~cnUlXo&j6Ib6^{I9=rfv1UrQJ@Rbi= z`S6twU-|Hr4`2E4l@DL}@Rbi=`S6twU-|Hr4`2E4l@DL}@Rbi=>!7s`TI-;-4qD2p zERR?Rt#!~^2d#C`S_iFl&{_wrb;*}rkQ zez_jgjKz2eJPaNIkAla*<6sZp>KAU(tn!G^t?A4hOr>TzxKduZNmgpi0}H@M!3wUa z1gpSmum-FJUk2ac`V-(u@Dz9&JOj3Z=fF1bJa_@T2zG$(|0d03UJ9O2&wn6H0eirH z;b#16Gyb(%J?~JB{cE#+i;ecL&H7a}+P^mISJi0$+N@tyqy1~MepQY3ug&^ZHQK*6 z>sQri|Js5Kw;;nU$Z(5Rkw;W-8E#Qe{#a-kZb61y)DxF2!!26t`5Mb`i&pnW%W#WU z_eRTbi&pnW%W#YOY_trwsLw{raEtnEv<$bX&qm8|i~4M|47aGyM$2%ER%$N^EyF@) zHHCp^HHFM-3YpauGOH5QkXcP3vzkI?HHFM-3YpauGOH z(UF!#nzOjvPf2BJPkV1vPf2BbfjgGtjOp{%OY8k(UF!#vLaJ= zq-Bxjf#%MUmPOKzW$sAJBF+6=<4DUQ&HXk6J7jN0$9nCMy}9gIuN~4_nb5IbJESjv z>R2!BC2Kczhb-+oLdSaTkiESl%+dO5hwN=Y=vc2EvN5;gSg#$jF{5L>c1YSr$9nCM zw2hAS+97Eh9qYA2Hs;nG>$O8RW^}CA4%wK?j`i9hj>>{!`d>`{i|Kzc{V%5f#q__J z{uk5#V)|c9|BLB=G5yynSrm)ue=+?prvJtCznK0P)Bj@nUrhgt>3=c(FQ)&+^uL(? z7t{Y@`d>`{i|Kzc{V%5fCHQ*@{$7H=m*DRu_L!u_u?y-y`^Y1b>gL!u_1b>g#JvsuUkD#m7tW@lw(Cryiq9@$pi8 zyc8cV#m7tW@lt%e6dy0e$4l|?QhdBreRB&Qqe}7dQhdA=A1}qnOY!kie7qDNFU7}8 z@$pi8yc8cV#m9FencYZcH4 zQ_BzPl*PZWirbZB6z@sdzp!O^oOT!~+vCdcxH3Gh438_r3GCZyfk1NCD%J8@{ zJgy9nE5qZ;@VGKOPNOn({R>-$$Ccr6Wq4efIC4+?3tNWAmEmz^cw8ACSBA%x;c;bn zTp1o$hR2oRabD{?z+y6|yK_?|rrkS(MTHY!$L7 zqxab=WKl-%vsJLqR>3}71^a9jl9GGqeYOg%WR2cut6-n4f_=6M$PYu11p8NU|D9RwK!3Bw39ltC3_ilB`CO)kv}$ zNme7tY9v{WB&(5RHIl4GlGRAE8c9|o$!a87jU=m)WHpkkMv~P?vKmQNBgtwcS&byC zkz_TJtVWX6NU|D9RwK!3Bw39ltC3_ilB`COHAu1sN!B3A8YEeRBx{gl4U()uk~K)O z21(W+$r>bCgCuK^WDSz6L6S8{vIa@kAjujeS%V~NkYo*#tU;1BNU{b=)*#6mBw2$b zYmj6OlB_|JHAu1sN!B3A8YEeRBx{gl4U()uk~K)O21(W+$r>bCgCuK^WDSz6L6S8{ zvIa@kAjujeS%V~NkYo*#tVNQwNU|15)*{JTBw33jYmsCvlB`9NwMeoSN!B9CS|nME zBx{jmEt0H7lC?;(7D?73$yy{?izI82WG#}cMUu5hvKC3!BFS1LS&JlVkz_5BtVNQw zNU|15)*{JTBw33jYmsCvlB`9NwMeoSN!B9CS|nMEBx{jmEt0H7lC?;(7D?73$yy{? zizI827n>rqS{Cujso*$J@W6@0J96rG@u}-ig{PUAXL+ z(!J7%%if9FtJ#auJ5hTzdog+^YOiE|Md+QVy^?uU_<&9x_e%1v_fFJaR;GI;bGPQ5 zsJ)V;(K}IlHHR^JCu*foggUh3eb4qkM>ky@^UmpXV+w3PZ>2QPK-QU@<}@Sfogg zUh3eb4qocuMVXIi*}T-jOC7w_!Al*y)WJ&~ywt%<9lX@ROC7w_!%IE9)Wb_Xywt-> zJ-pPzOFg{Q!%IE9)Wb_Xywt->J-pPzOFg{Q!%IE9)Wb_Xywt->J-pPzOFeq2hnISI zsfU+(c&Ue%dU&aamwI@qhnISIX@Hjocxix_26$h|X@-|(cxi^0W_W3amu7g;U0L$bW_W3amu7frhL>h| zQH+4bgl2eYhL>h|X@-|(c+vWXc07(X!%H)~G{Z|Xyfnj0GrTmzOEbJQ!%H)~G{Z|X zyu2nZdV<%~=RTqDi+N3bc8#N0UlT>6qgY=PMWdrwUlT>6qgY=PMWdrwUsIcX!Rxg7 zI&HpAo3GR6>$LegZN5&MuhZu1wD~%1zD}F3)8^~6`8sXxqs@J^xsNt=FRAG6qs@J^ zxsNvY(dItd+((=HXmcNJ?xW3pw7H))_tWNn+T2f@`)PAOZSJSd{j|BCHuux!e%jnm zoBL^VKW(-Ulh&e^S8GqfF=;Ktq_v33CY2qN)*@OiJ0`6~5xiPC6O-0Llu?UjBT>~j zCapzt5|OQJ0`6~J1W{2){ctXbWB={c2taxNoye{t%aDh7VWXP-Z5z{ z+G%mwF=;J|-Sv)`W71kQdwE^xn6wt1#=azUOj?U(GN$F2v=;sD`@4=wYtc-`^^Qqv z(ca!dp<~ioh)HYFtiabeCap#LG`_|$X)Thf`EpEJi==9FOj?ViYIICmi==9FOj?U( zK1Ro+wP@yJbWB={WT8s8=jE+fb(Y}q*F=;K@w=p^oIUwB`J@+^u-5EWPIw0K{J&!uT_;Y~q=YY6#e>{&m z!1!}O-1P(p#Y?NukwOR6f1_hd4iXn}P!{O2V@nQdBs4m<j<=tKnOC2LhC4e9fj6WXdQ*tQD_~7)=_93h1OAM9fj6WXdQ*tF=!ow)-h-ugVr%< z9fQ^}XdQ#rF=!ow)-h-ugVr%<9fQ^}XdQ#rF=!ow)^X7~5F8gRqvN=ai=xYpB0H|N z-UmWQksX(h_*2Jm9Vcq#xO(EUgu(Q#bIMcwE)uH&L^bR5@lQ9lrz zfcgojpMd%asGorP38v=vTU;j|S_Tj8`7PFvx$6;4~>v=vTU;j|S_Tj8`7 zPFvx$6;97V{T$TKLH!)m&q4hh)Xzcv9MsQ2{T$TKLH!)m&q4hh)Xzcv9MsQ2{T$TK zLH!)m&q2Kn>TOVOgL)g(+o0YC^){%tLA?#?ZBTE6dK=W+pxy@cHmJ8jy$$MZP;Y~J z8`RsNeje)Qp?)6f=b?Tc>gS<;9_r_zeje)Qp?)6f=b?Tc>gS<;9_r_zeje)Qp?)6f z=b?Tc>KCAX0qPf^egWzipnd`B7odIt>KCAX0qPf^egWzipnd`B7odIt>KCAX0qPf^ zegWzipnehR7omO;>KCDY5$YGAuI$1ZS1&^SBGfNJ{UX#aLj5AtFGBqy)GtE)BGfNJ z{UX#aLj5AtFKLdXUp38$UJ^Qr?~-Oju5kp~CC!}wSm+3}OPVjzGJl*^bc>XqPmr^!1KFyQEpA(Gh5uG^;c^0_~FKlSW6NUDABg=m@k+ znok-Xfp$srL!%?mE@^i3Qg9jRT}FDBk=|vbcNytjMtYZ#-eshB8R=a{dY6&jWu$i* z>0L&8myzCOq<0zVT}FDBk=|vbcNyumBfWN{*N*hsk)AS?i0gKw*N*hskzPB}Ye#zR zNUt5~wIjWDq}Pu0+L2y6(rZV0?MSa3>9r%hcBI#i^xBbLJJM@MdhJNB9qF|ry>_J6 zj`Z4*UI)_aKzbcWuLJ3IAiWNx*MampkX{GUQ}m)@7ZtrIU34J54y4zC^g57U2h!_6 zdL2lw1L<`jy$+;zMbtM0S0ux?g^n?}BI-t;(q54~jXtHlB6%7e2c>)a6zOzDefv=8 zIH)U{rEe8F4(f_}>rWjAbw&L#Iu7cJr0o_QV{k>%HaZUKill9H9Mly_+vqr`E9$eq z3=8v@1*~o^uLq-chdh(`rk?aJL!KX{qLmzUF!LR zT3PxHdXguuE%UqhkfTv=%lxR!=$Yb)%zh zbkvQGd|zpXK6N~2H#+J@N8RYC8y$6{qi%H6jgGp}Q8zm3Mn~P~s2d%1qoZzg)Qyh1 z(NQ-#>PAQ1=%^bVb)%zhbkvQGy3tWLI_gG8-RP(r9d)ClZgkX*j=IrNH#+J@N8RYC z8y$6{qi%H6jgGp}Q8zm3Mn~P~s2d%1qoZzg)Qyh1(NQ-#>PAQ1=%^bVb)%zhbkvQG zy3tXO#(_COk46BabKmtyQ;JZLc6x-)XV@dX7&AfVzUyH$=+S7fR%PeD>(Mx{N$7lr zJsN3W5;~t@k49RTo%^mwBZJ#_?zG;W)gbKmty8m@QlyB^8G=-hWb8dZ$Web=M$#OU02J(7vh zx$k37cH4{H_F}i%Z>HX3OD}fYi{18Ox4qbHFLv9D-S%R)z1VFpcH4{H_F}ia z*ljO%+l$@yVz<56Z7+7)i{18Ox4qbHFLv9D-S%R)z1VFpcH4{H_F}ia*liy=>O)6; z=%^1J^`WCabfjH2$)^t;^`WCabkxV#;(QDl`qX1fA3EwoM}6q14;}TPqds)hhmQKt zQ6D<$V{GX|M}6q14;}TPqds)h$Jo+`j{4A1A3EwoM}6q14;}TPqdvx#K6KQFj{4A1 zA3Ew|Z0SQsedwqU9rdB3K6KQFj{4A1A3EwoM}6q14;}TPqds)hhmQKtQ6D<$Lq~n+ zs1F_Wp`$)@)Q67x&`}>c>O)6;=%^1J^`WDF#+H7@mVU;Te#Vx5#+H7@mVU;Te#Vx5 z>7^&=XKd+bY*F?ijV=9*E&Yrw{fsUBj4l0)E&Yrw{fsUBj4l0)E&Yrw{fsUBj4l0) zE&Yrw{fsUBj4l0)E&Yrw{fsUBj4l0)E&Yrw{fsUBj4l0)E&Yrw{fsUBj4l0)E&Yrw z{fsUBj4l0)E&Yrw1I)VyWW8?(1I)Vyn0F1xk`)Um8#a30I3Vjadfqs|yla4Y*8uab z0p?u;%)17dcMUM_8erZvz`Scf7U&i{Zyb;X8a;0ukOdk&Zyb;X8a;0uVBR&rylX(3 zbx%BR9AMrxAT29Sk^T?T|3UgcNdE`v{~-Mzr2m8Te~|tU(*HsFKS=)v>Hi@8AEf_- z^nZ~457PfZ`aekj2kHMH{U4HJ?AEN(5 z^nZx{57GZ2`aeYfhv@$h{U4(LL-c=${_F8Jy6;O*l}Q+*C!r)OtNd^|UghMG@+jS5 zIdP<%pbVykBjrTh6In7+PE!5lk@9$DlNt)v2HSMbQye^`SCQ@@-Kluye9GH`Z|MD6 zo&RjtHO~jXp?iFPBX~A=Mz#L?l*Uj!vufn~Y1dkCZDufE5#0BD&Zm#-`w_MFtY~~g zSKgzHc=zaP<)zZQ4f^zX^}*MCBbYPNlV?@;b$wbaKAuti^D6Dq6;J8iRr+(U(f_)> zzf)H__uSpO_9A-O5Gx$e(UXUK= zC&?w~EHFvhNY>N7Ldq^aPA7rmmA`qSvfZWX34N1-8-vMuYUs_u7lK>#bi7-G+mxU2 z4)uPjP6E^QTRTIUEoUiS{VqKtY>s|~=BhV$Bd<*5C(BZ{tNWFiXrX?m7D*;K$}F%% zzfenq2gTts>0pI=yh`^9KOC&q{k3a@FG}x^NK)&9f?$2{sP2kg1=I{&~uXgcHNOvBpn`*2EHk+*cNt4H!lP)2LB~^ zNtRWr^F_re2N#0h3;u(im-Ox6H-oKmWn`BY&4Ctk@MP z4t*`M?S*INJ+zFTX#V=pE_R(N`(YBr6kUjVrP=T)S=bx1I z&F#-bz7dQcMt$bb{ftoCrTslF_;arR#>B5r{QB5iCw@JpA~h$aA}M+NTVp>O_s;mY z;@%ziv*Zi$RpZ|pb#(k&32PG$j{BJ&PJ1HxLU`Jkim|tj{b<60EpF>crFudYO(nNvRk{zfa8(x6|caiQ?IwrRPcO-zZ5lRlM7ClJT67 zJm)U?o%1&;3%>kiqWmRSo@d{<4bQkkp0P$A_a*(CCf``E??0x0v*Z<9qsmw_$L zWmK6jJJcOUvcp~S!BYLZ4=Z$}xFQ2(yRV4CUj19DsH`UWVzVrGrF`PJ{O^Q3<5Ah; z1$o^?{VS9uw#(Yu4(QW`|+~Ius$$q5j>j-<%za1X!lo z=Vi@3FKgy`SttD+I_K}u{PVKT_&YQMy{z;74xQ_F=rq1VzcRi@&UeW9{y5(q=X>LP zXWS0W|1N9xcUg14%bNLJ*1YesW__1+3NC-qUuR);4pwJib^g_hdO7#1Gp{=DsIdODw{ zvw1p~r!#pvkEgSEI)|q-cshTlvv)c!!I?Xqx6@fW9gh&vd*|zPwod2jbf!+{>2#J( z#}hc3z_A35Byb#oqX>v05KZUgbVg3+<8(Go=i+oGPUqot7Eb5jbOui6-*om(=iYSY zO`q*M>!x#VI^(AEZ93bg*1dr)Q_>kFolnx)B%MprnIxS@(pe;(L-I!HYCyUgkgf)#s{!fC^UW)Y zgY_zOKr$bYTn8lA0m*ehavhLd2PD@4$#p<6slAFw?NvN#ucA@Ck{gg;UA1rLQvAfm zx5~!1isBh;+}RVIJJFe#oHx-~6P+{B855l^(b*E6D=}Z+ah^nHNpy}xXGnB@L}y2I zZbWBBbY4VfMRZO?XGC;9L}x>EE<|TSbRI-!L39qpf67;!^UxU&o$t`u4xQ`JnGT)j z&{+M;ny`fW=PV00!oHPzYL8i z&WZIMNnAPkRqxz^&K&5xfzBG}oPo|5=zM|B7U=x@&J^f8fzG_|9D&Xd==^}rxbJ-X z&J5_hfX)i&oPf><=zM_Au6Z_fJXJo?V~ z=X`(8_UFuR&h+Ozf6nsf9DmO6=lp)o?&sWo&g|#Be$MLWoPN&e=X`$7=I2~~&gADj ze$L|O9DdH==lp%n-sjwX&fMp`ea_nFoPEyN=X`z6*5_P(&eZ2Tea_P79DUBv=lp!m z&ga~G&dle$e9p?}oP5s6=X`w5{pMVJ&cx@eZ_dK!9DL5e=lpxlzPD^dLwl~%P`Nbp zp)^!34egO;(xjC=(#ChCg?-Y(2hzd^(!vMQzyV4A14;b@NxXYRsvkgLlVu9 zG(VIyGe)HOp`^J-(%d6y?vXV2NSb>j%{`Ll9!YGUB(_fy+b4* z)Gw+t-#PD{v)(!9oipA!-<`AFIoF*t-8s*lGiN(*wlmy0znwE?J72c5Wjn8(v)VbQ zoio}wpPjSWIhUO?**TA$v)DO@oio@uf1R_}Id`2i*Ew&Uv(`Choio-sU!AknIai%C z)j3a{v(!09oio%qKb^DFIX9g%(>X8QJ>ujtx^uoTXA5(#FlP#Lo-k(#bB-`)2y=cg zX9sg`FlPpHUNC0`b51a41am$xX9FwO%bCEO2h3T(oCC}mz?}cf*}t6o%bCBN_sdzo zob$^Wznt&O*}k0X%bC8M=gV2Xoa4(GzMS97*}a_G%bC5L*UMSGoYPCsJkbosnT4EJ z$XSJ)Q^*;GoKMKvgq%yrnS`82$XSG(L&zC~oIl9fgPc2PoW7~&jOgWDEY8H@JS@(_ z;v6i_z~cNX&c5PPPoH@v=o>%KH?%XXmvff*xgQ;pS%+liIgaNy9pbq|Ja>ra4)NR} zo;$>|=PVuKxkEg6i02OR+##MlKk3jc&w0w6&%-&&oT1G5$()_cSv;J>!+FV^mCQNG zoRQ4=$efMLxyYP}%z4P1h0Hm~oPo^w$DDo4xyPJ&%z4M0b<8=(oN>(g#++@;xyGDn z%z4HpXjHym{;g*%=;b?_eW$eVX7;_zzDL^kG5aoN-^1)Xn0^1U?_T!3%L}wWq33kz z0liFNAbyBmFPqwj3=eT~i@=G)WeE zZMv*`x?0&Jx?9!KCbhJhm|SOx^!V%9s$+4l&RB=%Bg3;+$KS5h_Z)lc$XmzVIuoSx zKsw^q@wSe(b*!x;Z5?OpC|k$aI>OfRwajAG2S?UAu9jJ>-aDe!@wCqHSgLwQ(mIaT zQM8Vsbp);BXB|E3*jY!;I&Su#n&mo9)={#Kk#&Tu<6|8i>)2RF#yT$6QL&DRbwsS= zVI2+YSXf8GIu6!Ru#SOs1gzs<9sTOqS4X}&?$uGRj(HuP73-{7*E!bJk*D>}pfvCiv%EPGZC2)%sok0Vwcuj*)3$ErF~)p4qhQgw`Km#*=BK8{XxY^v|@ zaa?Mudg53q$4EI6>O<-5=hD}QYTdCFj=^#SmgBD+edX9IM_xJZDoy+x z5f8(oprcP5J>kd`$DKIp#4#t1IB~p*qfH!Z;z$$6nK;VCF(!^MaeRrROB`F`$P&ku zII6@kC5|X@Jc*-8982OzlB*-?jpF5icyW}lo*}2dj%jp6qvLKI&FEN0M?E;^!BLEk zVRQte;};#h=-5R^E;??}QHzdQTq(XD6kl`XIUA&(InvLA@|O3---Gg&_ca#j2?Bcg zyvrvkK1cBht=fwb96LVQ^0}5z%za+&({i7c`!vgESyg)ZjNB*W zJ|Fk#xX;FYdgZe#pNjiT+$Z8bv+{|R&%*tDLO-3*&n9%f96y)PPbGAwoD+IEYld@X zoYu?vGMp{LxpABs$9Zv_6~{Soe9GOSzdqsi`L<8DeYWkBZJ%rVRC}J}t!EJG<C;Z1b^4^!=bS#}^ckm5IDNk9(@mdk`ef7RnrZ6! z2I*Dfu>OYi@|lBA9K7G{(}v+*e@DGmu42hAM_%j56vw4FD#bA=j!5yjf=?BErr;9= zpC|Y;1dMLo%r-%ct7i3wI5dW?ANww*9;u_zW2ktXEwYab_;*w WwHG^1yNvPL2mL_!h-%}4hyNEi*y0iZ diff --git a/www/bootstrap-3.3.1/css/fonts/LatoItalic.ttf b/www/bootstrap-3.3.1/css/fonts/LatoItalic.ttf deleted file mode 100644 index 7c831985252664bd3f4b23e391410a6eb49ed8e2..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 81332 zcmce<2YegHl|R0-i$(991pq;?g9U5=JHaM4Nh~T9)qAsKtIL+;D#=yuRql3Nq&SI7 z;uJe};+)g_&$&xtCzp09m)s>zE>5vT=>L7QSP-OW%gNp6|4HNpcc;F2{k@qHm>>ua z{6{0$`$tC>{k{G1MFOj65(JmIf6-+GZPi#1_uR!~@|D+(iu@Zk*Z{D?K=bq(zl7jG!GC|P(a?85Cy99^e zNBfodZr-xvvdtHNJf~C;SiT^T_>!j}i|J-!t$Y+tb!3BuRj#@|I- zcka8i;|ue`_dzLwk0V z9|laS(9aq9q);X_32j1BNF}|=&W`rB)|Tc(V^y@YxUj(G)M|{n=j(+QOW?g|HZ}_<#XsT=O zrnG`V&>93ZFju3QhHSb5eO_|tpK3#=(+ff*GbkEc*f2TyTvOE5A=TFfMUUI6v9U;L zHEV3>&@?ubL<+59q_EW05Kn)`UnMN;2q*CG-JIs$k?PJZgXO`hcr2oE95RY5Sk+h+ z9BeLcD$6(Jm^XC9yk!B0BT(jzb)+7XzIC>)PTFwxAg1>-3&IQgb&w>dRG>+(Lk_;7Is606GX*?Sfs~globgS< zssnCn8EPx6;c#P;RnkQ|q=ZXq=n$u2R4t0yd0MO8ZQjo$S*M-%x+`3jms?%vaurtR z=2eAV^2w<$R4rM$vY}z+(j`@5$GiWEuWmR0N~M6HG}kw!`^B%z_XOcIFC8nV;;=qC#CLkn1gG-%x+a z_ojaGK&Y@V^Z*M_|5D}|2cx#%ZB>ENB<|Wq(I)ko3FlY@8gmd5~ zb(nd*pciZ=y$uauK~1vJ#PCZi@J4}_Rtp1uM+CE-StPTCFjXT+3~Ngtt<;Oa=n*zg zrdIRpjU2Ww?6`j1ras;~2U+&ZZq>lMY{^q1Dgicw55 z->}e~quKrLK2t1z!3}ptCDHcH?f>b~mzF$sz*rSnc;mY_F7W1S4*Z)}Us8PQ_D{O~ zqGX@?@R{xJvQw#Ld0wlTtxDY=39(aUI-4=UhWqn#*+qeZ)G~I;?=~4y_u)nAMVE)Z zUde`O{UxFQoI|r-yBXZLM_9=ACaq22I7NkdIbM%W=2&h3{M&{?`B>(1GZ3;<5&?>! zz%(oXh>8t>ivU~&SOIhJW?3UQf+QRvL8I|#z%_@Tv;1$`a4Kz(H2B|+gTz3`KQR|f ztVo?rvi~1%Kq9sl0Z^2N=s^O2V~$+SN)w#T`&`u$_`lf62wQYP=Hp~tEtX0_2_izY z0p+5MHPD+5iMfNK&t;X^rw_i|+3pHDqg^X|w{#p_)!cpL`AhOOL3grb%dPb>lhA6K2q5gi`Y^cUERo5 z@rjDg+G0EVnzpKUi6F?r@^gQXualn=TtcZ(EA$DIY-Q5Bbn*P5?qpNEwx+V8s4&-W zx27e2KGr7&tQ2&_14{&*pf~9B^h*>0K`vE*R|W$Fevy{RvRN+B0>27S4|sT?dMHno zwX~XAty5c|LtVnFra9|sG+csF#|l25SD$d3aH<)o54}W$egee=KQZFDMkC9%tO0mv z0Li{gT^USD)?TO$6fqDosq>)eg!O4;V!)C}VYNtTL{d=)Tp?Y;16--E>kv6+DOhxY zlH!kA*BFBJWHG4a&=l|;Idj4oa9<&dEo+Z- zHLXe)U)5WDtx~)(T|6GrT)N@@?TPXQm(1Jnz(q~v3wI6F4ODvzhxU%u_EmYp{kz!` zljGgv78|>H!vot;@M09)p%m<|_7o278LOR#f&+UX7n{$$t@*C}w9pN%6-&CAFxX!g zD=&?N-A;>1=w{t|l2SpeO(z&Hn?GD#k}qo|5qwL8OqJ?@QCO@Z9e6k}N&ArAn ztwshqM1Xu6Xc>ftY8%v4SeF)7q;lpnVkb~Ct0e_PygpzDmsVD$g8-`*Yj^<#n-W|% z6^ZH8*Toa~B7Se)p7AQSN!DosI<3FFt-OA`wVc zR;_rehf+Tl7ild*NYEuU9uqS~Ih$7GJhAs&G2sg`C;?WmG^aJMB2Viyk5#mmI185C zwZC6)whrxCSk68(^vI+4_t?x1kFI*@r#}6OMJJd6Fb_RmBRkA?&z@hrojQZjo%>tr z$Lu?5eX^f$P7VYyU0_$c*f za=7(16QBI_Cl;Sb{WbNc)XyKU*4j-D@1Ebh0}&69+$F6Oe}OMMXuy+v{()`}BIoau)kVqrnt# zoGv&WDR2aAx7Xcn^Xqkt`K5JVa)xadmvQ6ZCXXa}HV{Vi9ZwdWPk^WMx)4u1b;qsVJR_aZ2S;n2Ku^gbeG#Qp5$D&?Ww;k=<`k zZEn1|F}2Ok?u~11PA$47HO8L3hJBQ}s!RQm6$$?ZU%{HB*5}cPqDm7^3uD}BBYbDf z%(&@7+-lYr8+}RUDaHA?BLoIsjUH*!EHQ1f>Ie@z!~|61x~_PzI%LlQ2M<{aDoSqbK6(ebc@Vfq0^@a%$%%1OiS;qw;p<%?u+=S zTAa^M;`&-*mcdyCn=vo9ifqU#SeS*bi_bSG*|}%WJt?V8qjf6q($~|jgR!fRrZ#=LGgRmhJwMIf&@wbAl6Nvw^eIdWa8M2NT>2FFEQ#r z$qx#4;p<7W-Db6zO*%-sj87tB1QNkRLdG9PO`_iv!X!ampeP7yO~yJcP>XWIhE^i0 zoJ}c5L|rjgISs5(Au?To+9wmV=Dflrp9QG`V&KX>C`Y*F9F5> z%;JZgskfYNn_sSE|90Y0mT#Yuj!FN$;Fng5ewgik_czA~VTBqrHw2t$5I&i-gB;*h z^LgzSp@B7I@S!ROV-`j)gGL0a7P>-R8bbg%(ulCYL}j9A7P*Q|3?X`cB`S?c5Xwwf zv55d^vf%=yIqHy6q;y0NFgDKF6qlH&gF;dtP8-Q#k_xN?B9v5Gt>W>h!3**0i*DZB z+`RtiP-?7vyoCKWHy;##c0eb(ouYPd&q#TsV@chvhl)*+9NDa$$k}l1lk(Fw%dZ|^ zanH3^^rS8|ne%ey)0Y785_4jNhas*sgLFZfsxb~3O zk_l}s@rLTE%4j5J*>x|^3<>YHD=?l)jRzR$;57Re%<>3&nBhpK60aZw3og+oC4P z&LCAtT^~|p6oZ4CuwGvfK8+3#J(dW|b^cQQZ1GL&;}r{b_8dCA^p4lIZ@g!Fw|&&> zbmhtR%I=k2<5x{o2NxdOY=8Bo!j8ptdmbz?Mf|c!UWPS$LVmh>$)$rMmo0B~MjqI; z_6V%)7EfXz)rsaEDV`Hs_hcype+c?^odtg)6>WSoc)@+9F(k^&~ZzQc= zkKJY>S&c==&_u{;0efIU;4~&nZaw&f(ncVtKxLC^F%YY!VMbX|1m;sQViD1FYrGhj z{wNC=f<+L~pm9a|GtMLGP+F3~qo`3{8rCx}jAfOW%n3}X1%yH6j4q${B|#5JvkD@U zuypee$?AK)`oWs18{LJXR*F9L1<|aZIw@*JalOr(I?fJz9TU={sn`99z*I9@?FD|% z1B|MLpC;|qRpq7dBl?|oJqb`1vs+~*v&tyO>IDMV5!V?++%B$>uC4S0wRCAiz#)5HEnWzBGtV2l9k&Y+Sah@;Wzeo?pm`j*zU=9)%2|CS#;CJMA5*- z!*zRmw|r52LS9f*le*I1yzz#yE53Q#h`&4@9P)>XLrt4*UfR5>r^w+9i4OumqOcXP zj=@d|LL5CpT)L*JIFjRo)DE&>1|y5|nMOfKFllnHks}0PRcVqKh3Z&MmqptmVP&R5 zrYv{?xN?=!SamFb3qv1aS}5X*Ihdw+_!-2{jNGuPW$|5KJ+S`%9nJa8 z6K(7nTYd0k%3WQYIGTE}sCQ#>Acjj=F>+NoY=Zx@;EcQ!0Mu zIzbyG>bX>bD~73R_J;n({%CnYeYhU6h7b#7WJj%8B1%=MkoHBnX8kQ{H$1kduEOx1BoJc|-O1zIn;z&3Q%h4=!q)=!}RjG%VU&U$wBcuxkF+mgs1EG1208fl~+h zTGR>;5iM3%mK1SX1pKFIF+gDsFlYb~9&o~&3~51M;);?=i-qa35F{Fsq7Wm~wbD`| zS(PpXf`$4&T@s^FxE5Z*B?XC)0Wr&R?Gad~QP9fW!f8hi@i4J*_?oqe@ms&JYxUh* zn}V&2ECLrio(wgD0w3 z@scK(^zpM_qY1DdD-%d9S0*67As$IxGS>uB7t{EUo%^HY0xv2SnuV8=)_4O&NJ0V1 ziO6uG8Ua=XI1yR3Sve63|Hml7jWon>(#~fJau7jP&0P(>s;LxeCAgcRYsD{EUM3rc z^ed$^dZhKMnRyL~4mmrgVP?SoSa^71L({z7qZKs+6C>@$;)5osasI?$?V7Qs@zzp{ z-)K88hVKhBl=&)#HnlE3FwxnXjNboLY^bYaU`6}F<-ww$_sqj{;GQTfIOmX`lNSh! zg^jE^S+H~o6IQQWvT^Cg`9sN$=0trhQLf9OlZC}>v4u2>9)NAs!;Inzm~qB71`G^R zlvvQhnA5|E(YyQ!erQe1?^6x+cmsz zy9T9QW{?CP^|@g4hP>pmf2?I-wE^S+ab|)s^gbh3QdWu!OG;JWPKO2|Y#$=tYJ6#i zlZWC2FyQOFA*R)&l}A+I=`Lb1WK_b%6J0!RuST3VuIapXAl6^)E9hKt@V3RBE6R_# z9M+t$tA5>Zb?>3mo38txPwg1J^-BkC{4KL|b40#5L`q?tRN3|d*7_BsVzlrBI99Z!#dDJe-NH5)=@=xQNk zjWkS`gy1BNRJA0_(k)RTd?IgQI^_YR2W13;lOE)1s?I7(sv0!dI&g&gxhteSO<_2h zN~JJQTwwJqEP;`M9cv!EEhk@IIQ8i#48^`X#LvBw>R`V+rnSn}fF;MxR;M0!=E*0| z9umiLyGu%Xa?y_@tOHy&0WNN6wiUu>l3tHT5Gu+F3p^oD(C@{2m&AB%j$~e?nLJN` zkq#V9RcSFn1YU$p>{ZLSSDNCy#KtPpbzmPO_lxUR)3p^dEGLJFg}KsN5-C<}#F8jm_dGkb>#?nM#Y2}2U42dewXa?FjZT(3a_MN< zRad9}`s=aF#>$Rd^LzPZ)uMxg$$jhR`vSM`+VJG1-Quk&xnkkPeQS0fi!RvFwPg$D z%Y==v3H~OZhX3wcNhcF17cR$Vv*@)#4Xepm;0*!zl|ZT7a|d&nJaVOqA!F3}#K&>UTbL)i-V)-uHFpe0ctm&5MeXdbiD4*0*zF-`DP1 z(z4~2+r0&)1zw#zwt4r;C;#Jyms$KLhjZ)ZMHd<^Wi@51KKhrFmppg48!{C*DYpYB z%|ecFFlqFW%LokWViE&@WEx_}FD#XYN_?%sU)ch|an&CzEh8Y0U~dO?$Jz75JEy;E_yf zjx6)}!RI{7?Oh0wCLl~jWv6Q)D6W)*hVK=cO81NCoapS?|Lv80Q-_AA@i#iO`{{w`F|zfvj<1>dLtIY|PV{ zg?aRW;oq!j*d($Vz<@;wtaG{u2%m9S*kD1WIS~6TNQ3A!mh+g1pm$gWtM4rgB^Fhfr z04FCKo+A)ZF!Ci;y{&PM>KbSu8qga2K?E2Q-&vKBO9@%f`GMB zqg#(?8g60CK)pz0n8rVAqO)Brh#aA&5J;)W_czW^6!B&(I?=s|ub)tL(o zhU=P2np476FWw&b!P`D!W^es|%4*$d^U6B8aN!jzr7zIj zg+0KfV$8ij_)gMV5DEtJb4f}-l~+BBu;RhbDR+cNK}Cc}NnRlFi$Y|oq$rrH6bWJ~ zmlYkTP|A`2j;NO`(X3|E6#yDAq`YJz-6+H}m~UB@C+aGbT=N@zBILzAA_4d-} z*w{&$ z0UHR^q_1YD8Q>FK*3+MqJcIo7TaLE`9;G5Z(jv8(1WP@u0e_mZKL7H=5A$K50LGz( z&=d-Vhm+<|AV1IJG@Fe2X<6cv2#tbi-dP9b8QLa7J~S$IA#>A(NV7&H6%a)zn5&gk zf&x7Lxl2SLDhucnDYoE0(CbAC=}0_NmJpsrRm6qIBfT_O2#VWiqpYwLYLbo?2BsAV zL~D|rezD#f$hqmcCyt5+dFqYan%rtf>S(m7JvlzJxLwqUS3UXMYG2SabuT()nDtuuq}hGuGrn?{#{KRVn_Dv=JKY}LnICZ^ z5TQ%|QN9JT*&~#b&R0^DpUWdz>O6DNJ5Y;Ik*EJ*e8e@=+)VL5V&ySM60)j7hvpRj zW7a1wG~Yw#v!=~nry?w8XJg8@G_1Mq>3_NC*c*3`?D;BlJw`u1-?ZiKRR_Lw%V-l+ zL9PYX9eVRKcWrH2{q(PH_!O)E_akdg{rcve&mZYs^W5L>-}&5;p4HD{M-H$QJWR6< z^S26l!W~Js%?2Gc&xU#9jYWpHC}Tq)f`rr!tO6#dMbcv$5}ZJ@)LtlE_=>c54ueb$ zbf)OOWz;Kt*I9-5UJZfau{r&XgWVggr6hmF|9-7h`MZrXEdXME`9Zy(<` z^qnQwEUPZ;-P$MSPW?(g8Q*wf>F!sqUm*V1)TxG5SI=)**+u*SYn=K%U*mk3KHo^1 zs}PA->?MxP9*}5>2^^B>FynmXzOnRloy3pqO00zBSEe+Oq47PcuuNp7NNt;!1~3uX zCpcxG312lS2k%vk5m?E2ri_Lj8G*)K``jv@Wig$PL5P2hv+%uzjm|H|ceh;#lP>$g zr|)h^9dzX|hr{{)2&LfD65x{`!~Av9o0B65Igy;g{9L^8xg3O186CI8s?a%2-mV|@T6UWAi66;zw{(0NMpKn z_%$I@75~Qt>#4#r3rTfgO306epv<6aNrW930=8bZ=jok|4eM{5DDbexr)oW^KUoTk zYkEJm^IC0OxMQ(4&)azxUCdVy)bn30x#KHcZdx3aNFhk$^ zSNM9{g)b$ot<7a6k#K%4<%VT+j{0^;{2)jWmV-cnB;<}zL+kbatz zz-1jGe3b8}qnsSd)0~!kgm)5jWWbjc*O@vBUgA4&o7mycPmEfcTDId9(jS;F% zP)jrum=O|0IOvL+n6p$myrj5y>oeveiFUF_0YcI>=wxwP%!C&{eOPs?;meUyWc zZUrz^neNha-360SoQF`$)p<{U;>ujM-r~sAQa+K^;=wzfC(gAN#XyOsgNj@)b3t<> zeT{3?kt27*QThkHO}2*Y>_7Fz{(Ghpr{$BmuCqeHf{KdyVeADCybC8E6Rrm8y@v5u z3il?>$Q>&Thg|k7ud%;0$Eb%#h4QAk3P$(@7l%5LncpP=>mW(ozoB5GcSim6cbZZm z{{VU?PC~jEpOpqmsiKfcsxFq9pEol@XlFAgoc0j2$klh`1hG>Rw84zXcK@ip$REuK zYCaA(htXkVcj`+0cTBx_`U{dQ>MXic%_;e0j{B_9TITZl3fgj|zc}*g@7$Jxf)@T4 zl-Ch^iQ8RbKl3~WdhR9AE!n@h!jnm3uHRv^n4piSEAFv!Bn&D`K1*BmWql+{n5D0V zr#~x*OpT<=srVj684yJpWTXsAWOmVX1v04>0;7j2x(yWX@UgU3Z-D%OI;+)@V$c4Z zdiJ!(2{((u!giQEw%1Z7cIcGbr%nAxZ%mEl7QHM^i4R(>Q~%*|vcFhuQ#;O{@ma*( z4$IU>$(wf>U_pDQ-NIq`LJ<+fa8yXR%@B1MDMm(4OfGFzoXPs8q!x4SO~DuEbUo!8 z;fj}Da!Z~giDI3p_)j(?pJX;lh#%{Jxj%L7Q#rZ%-y5y6IpAQIo5KDF#P+Fw5nH9z zIj*TM1R8R48vNsK2#DCG9b@Uc8BE!d{YjtOfa<7U`s*h!4g zB?)=RvP=QRe#B1VtZ%foSTVH>wWT^{c_t4`Nw^P?HnqZiGFvv-Lx9ik_FwbZpS9IR4YDl$D`JSmrTwiJ*yHujr>S@m;p; zr>Rp0G2p%L_4|PB^4Y)rvd5jLZSpy2BR>eEq?2Uu+6BKUXNDwX zQ95g9HTVmC;`1Z4=ZxFPMF0pnZL?zm2yrngM7Fp_jo_A6$75Y$#~!xj8i!y1y2Yil z`d-uf-PgnMcF1jIYkg5qWi<7u)eV?DmiiCz__<{edr`jUh15!-ykrjX0m7vS^^ehI z{A=h>21<#?ZBtR}seSwSJQrwgVvj=KGf-v%LaiFaT@9I;TF?+{Bp@maXTr}JD@Oqo zK7+SI`NoSjxc#Qj$WObye=^&6-=YvZ_b2HzWJit=75RhKR zguW8Z!A8Xb86G5vaLVA!D1mP53s5XwYB0TLn+&6x_o;%JnRz|bA@YRPqekj3P|bE; zwPefej^NdTEF^b1bTy0@PB;7wMVLIZq^_V#dZ_F-%rQ>&Q7hqT#v{#8;tQ=Bk6VhZ zjN~|r7OmQxXj|V`QnhH`txqiPI@~t(M(ygwgZWW!)YG?GPrT~#0<^V`EjnN)hg0-wKX0Wx<8>O91L5r~e5?Ff*xWFNc|*W(pFP@C=v zqIZs-U@l46q^R^Kh$1Sg@rDam#MZ>w6>laq$?6g9%OWg9NK4ER8!L$qV!uAk4@q~l z84Sj8YgP?T$8%Q$$VlF*eNr0~o>08M*i?_r(2%+?H{fn5DFs7~FytBPq#!vN=s1m$ z7oJ^KvTW_v_|>-+c24fRYTnq<3X47`$bJ!9zhX2{P_jMIuyTG|xp%4j+EhdPrg^2G zeR2GWyRTjo@9pf$&6W1IZNFn8_4jyHi&}!E>2|M9vM1Vj<$_Ry6VY{iAODm2|BZS4=^`x%AKT-`IDP;J^=k5pu4o*d& z*FfGX?gphh>QxQ#WXJ_OJH4}GvIN2Ux)2U4Xjrv+Q_HgJR@5xG@zp&Wudi>?I!)HR zXjgsT;gyZ~O=Iz@dGYdap4Dxw{ABa|DreiylPeGZ{9{}DdwcZ8oKVj2H7{)L*wkO@ z$`9we95{G_Xs7YqpKy)?(M|;$CE5Wn3Ue#+D*Qe-q^Xd@a=4Fy$e`8>hj#(IsTAhc zQ0}>8Q7{nz6h$|uC7K@7LL&hGBKjfz)p((b2seO>WsxGdn7SArsIqO2%0v?NvwB8H z8V1-CN0YG!1WSWn1&{|r$`|G%5m{h&$*hUOUHaZtDIr&7BHWF{X#*k%dC83lT3y

EGm*0RB?hWOCPY3 z;?2PRquJ%j?Fqe*Gb1z(Tp^thf)@D0b^dh1JNe(VZa_!H{tSr#ib1iMxQntAN!lI1 z?d+G>{sXb$)~b>MyVF)#zi#s-$%z}+HiSD@?7w+z!LETw>RX-L$6M_8zqGNy9%+*D zyDypScH=ymYj1W3A_2D}(KuY^Yq{vY)e9duap^=|W$$=5GMW2bwawi{&e8%8(F&5o z&*{W($R86T%#d{AO+ zbu6c8dDp6|2=>ysS5tRMUk9&l#VJ;+!KwW1Z7U`hjrH}k4Yv&#lVC zDs(p^=3fLcAB6mqf(A?ib^+i<2^Kig0#+co->?c=?KIl!^~wwpg5?{)2GLUA%$C6T zw30?!H+PHg*BAvgW)1888^fVhG@jzDA@UO|=FdGM=*L=F!b0L8pt)vC%@M(=lccu! z!4;&OTV+ZiR6K_2@fBVlWz)v76+E3h2>IkAd&vf$C~0-+q*Bl+YbXHymz1psX(fTHWome{T6^v+q6^bYIDt%|ta zk*eI>>WIf3so^j=w6gngz!G4$)J8B)SB*m0A zrwbwlBAr7@RTQK{?QDUe0F`S*O1cOHd^~YJjIX;^Up0SQPo&Q8l&w~s!_?nrJpOx6 zq{`=y640Z51?Xo!-@a{OmC?A?qGN+&n&eyyzyuJw^nK8HFfF%(0@6$JatJe}>6mN; zQ7i7wz%)pBA}}k<&~FJn(@7>Ophby2@e#%33Iw^&{us!6?wX+d>(Em{C zGFt%IVkQCH2xQkIXnXn9K z@DhGWIP-$ef>Hf8ilT!<-C%x`;|5tDY68{t%XEZ?P!hX>K^o+Jg4GI_8qNX)Po$dg zsd3*DF|uVJfA-_@Ywvav%`xoh6Xe&RFT_|y(u+4S0oj3(!a$zaL;Dpa#`pD+RRfS} zZ~`4=^Z=HMIfw-k1ZxP+M2UO!J!B>|@f}^%8{v@l_U8rfcWdzUVq;m z?uv|<9zm|lqNyniC;=PslThhxK#uE^2;wmzFUKBnL<~B?#%viY5pe<J%&sQ%WJ^ryZCvF*`|K562^Nt5MUiI@2uW#P*(1t62{^1Q+ z49qz{bz1r{aLO-4+5Dt87r7M3R*B|D@y73QAL5wXsyywCP(7Mi z^=KZ{I;A%!+h)~-kBYOLSw2H}5*7R;-h(M~&ZFXI9=HW~Mz#Y`n&th=e{!5?=N*)UeNY~?u+J^tKPrXM5<5ojkXb=y&zOx5{ebX@^dL7ox$K53eV6e&+<+FvIuG z<*fKUX$so@*LV!hC%|uLv*0KSiigquy|CQ~x_6jh>k#iF7LcYS@I4BxtE{?sMnTT3 zGdY58s9?OXDp@aFn2Xh9^~^>Q_)|DFwA(DCCg#k==`_zJcebbqL!S;t5ey{AyZizO zdTZBXlNA*OHI?h`t8bG2lAEWo+0E?JC+>4T<9g-uDI6=r1S4{b$hX`qd?jg3G?o;F zL%IH$xkb&4$@vVzfb2H#**S8HxPLm0K3Us{>i@y2Jh+f-dGA_T8A%^By9l8iI(cSx zb`iY&#I?OX@eRG*Yz^1+#;S(mfsWNXS9c_~+`fF>-8GeZY|$u)4K~$|B=BL!>W=!g zH!NLoQ=PQPZ1U#$aw=QHHBIFuEz1YyUA3;IFWzgh=11~_bv-5ZZDoO9oe`v|5*5oAJn1N3s7AmK9bUy96LzWlbI6&1EzY5=w!F z{9klrO4gaAm2=dhYy<(pUgcn#={l;5^aIzy(W6v{G>OIw^}{!)z!8@oBR#@k-mTg7 zXa|Ha9pHe;fT0R>e9m08Reg{4=PR2_@S`(*NOD+5n@kknE3KrmYpmoECTX>uyDbg` z)7gW=8n1nIB{SMm@3hmdx0>?YvVdE!H^{}Y%RATY`kdBP)KbIF*zA(i=f}B-%{Eu+ zLszG)<#j=`R9|az+VqAc(c0}qD{G;T{Hyd1v=Ky2!BXK@4dmgpYwWzs=zD=2KfsPO zD{xcAcM2VyrNIbjw(YLPt77{H1TlR1#-7Q4>PjPr*pSRf1Z(Z{(q3WHGG@fFWsxxi6$Hj)1uFJ+?3MXExqHl zP3T*5l`4XXSvBY2Al3P(qC~t(u+xRb!A~eC;(A4ojdO<_36nLP*S(ZYUd(D zO~aY%b2@YDD_CkzcJ1lJErm#P)QPHW_6w)<$S20zhV$?uYo-^Gst+WJ3_xE;C=%O?FV zO-{>Wse7395w}dl6sE|#kLE+j05mvE zEU6FJZchEba(1Wm8IOJH8c&4>+Mal&-KESIT8}h|`Pzibl1AD^PieWC{65;HffB?$ z`Gm26q%UW0)0w*jyf;J{B!*}`$t1=+h_%ywz8FROGwz(E;=?d!{D>~cu?A_lvZ;8zz zS#4%kT-Lw7rTfyoy8*{%Qm0v?JOyC4W$jTUjD`O_4Q^&<Sf6RhBL0?hddwumjJPXl1j%mgkoTCDPg zz$@j<0|yEqAcZ`kpUwvGd!0yy<(a~HEDxF{o$ew- zy+n3IBNVi>M+ip;!hryA;1y?mK*J0i;Q6lSIy7bMYjqLKoMtJ0wrh~xR@}Ea*|2%d z(jw)LOQ4gSn>dNsGU2wY03NgDSikTD=`H5^@vpo1Yi2URm_NYzgQ1;5eAU4?G-rWkrEUrX_xq1W}JND0-x?ERyLI^Eof6 zASVp8bxFCVLUKbo;C70?j$gO7VZm+RJyu9JQdEs!9&6A$tma^}z2eT~ip~nV*H9W> zw02uOOxIGJ+_(LXVae%;wAO{g%>))tAE zc%|oE0r81rk9iPz?mh4!;x#rP(J|y$cCcvD-QJdHtf?w3E(qpfH?P^K5i_Uhfe&aA zh6fYGfj(Fnt)>nK;{m}K77bX&Pwq)?uTd2N(mhnCSN#0?U_%gI1il$9Wokn=QEjfy z4_=$QAV>-;Y>Xacef7Uz3otQZ{DWJRAb>A03baF=nX4tT#E2(C)2H)a$oGx_yA**e z#NA5j-8EQOI;=xW=5{q)J(OD))=7uNkS{eEGQ?wnwt)CCgJ|&u9A{gtk>+Tgw&+88 zeBK>4k6!)U&c%n9H9LphZmVDKh|~=>@tRG zda7CVJZC;LtbX#)yprw}jg>~DH7{1=j*jf=OZ{aY$VC*M5q_$PYSx0mCvZQLv7xS_ zEI$|gkZ6#6VNF&uPWX_7u*U}dRKn3SBz}Vy7|;0yA)kaJ&!OLt%16vbr9yJ0Cc7_O zby`V83s{i|v=B4}wSpeVt0R~qbD=bWJrtxSC45|9Yjr+dDYvRhb)^t9iS)G`>0^@+ z^A873uDG{yYfJOy=*h`@LxthMeJk#(+}hl{sq*CV`$FMkk&dyNnnmqJMeU1fYQ{Pu z;-l$Lh2h{y6x~8q?_G(a)D-<)Jw~O+s%yqOB9V@9fDhBX0(9~^&L1sg&ZNIE%y+!! z<#N}B+vT*AnQ2lp%A-hDhUp99pd*ceTq0$7=s`eq&r=DeOj{24U2Cd=o3298;74fB zSrJumtC|{nN+`W3RX|BP9KkuGL)>Hm1r9y)+ojMwJ&6{EP;=&P1*(l{8a0BEoDd)e zoKZ{UfGbw05u{-2wFb}z-tg9l9iuU$LJqF*`MNFiL;4?W4@}^HA7b&;*KYIY>)rrc zG5FkUjj7OodrD++Q|h#ZEj6b;T>6nx{?n2=E$)&^eeS7$3Ag0uw-$))j@+|9#Gba) z=UCT)>+G*mKRf$N)C3u{o;xaCi934c2}^~0lh)quXn9FdD1hAm=^T{AJa`Ki&u{e- zO+j;nR1;=84S^PfHN`-cv>stX2|HrDng zV)>C#WgS*)o)e#vZ|7%fUNY-UO>!^U0bW3t3|LT{z=PIg-R0tM{vkpih?k)t{V&Y1 zgK>=*vYeDCd?Cx03ZV*>QO_qLZ>pMk6%^&PW~jJR;nC=H7VtX(oz7sH&sSdHWLume zyeSXj4Lw6nIfOd{mG2cHr!!PRcL-+xjUlW$_b07WK7}0${lYr7K8bwamCHvLb|)L^ z%1Ut095j5Ko)cwJ&V5Lm8gL_qf}?9m(FYL&|LQ>RboN&a6N04$XBVZGGrh8>RlOHU zi;c0ky^$uW(>axEAPI{9C+&Hrua%tlKI6mPlA;!&A0GNXZ={*gp*7qsIr7gpgbOA~ z2&oOytoi+7L^!GkRbAV;GQ7oNo*x_}r#c;3pn+gQD2HmS?O z*?Z{e^*irvu9od4Yp8BPOaHFXii+Va9i2;?!)L1-)*gTSrA?b&e*D@s4Gn9qef;H3 z8()6>_}Yd|m1BEvdVJZk58b?XylTTUzd5$-@tgLJRkAm=a+Y zHNy#CwfNHE1(%ISa{@Vk+Vt{=P#^7nNNr2$WAcex_bsa8J2)n<{oS*hsuvx&^(o-Q ztx~6WR6dO}--CWaL93c#I*pXLW#j1F&W*it14`Z_eut*CGQ`1F6A<6nI0iMkP2xEDr-}Mu7pqR=hwz!Xc=lymiKfs0$Q5g2&C7*`_+d5$FtoD zfo8Tul2A(xLg}D~dNe;B0?!ki6eT?lix$x%B5r&jWrWOLIPpsBa6u6Fvx|O*Ta%HA4Wgiv#?y1&TMy|Ou{LK-l*YCQ#BQ(te{ zaBGQFqBCo&<4zAwZz`*+4mI?b>7Dx2(b1B~PSF{x$Ss7hzyyv9SBq29qwxP03x=fD zQ;a}9&VNlX#7l4~q89t@UHD~VbG$k(F>iy<_N?7*v|OSsXk9hyZ&B-I$MVcL+b#9? z9Fs9O^>?eKz?R33&-t48Efbz(9U7bXQ}B-Q8Ryjy*TK;jQ0dAsY{*lP7L6aEhWSha zHIMQRL`n&o^D~#XTvhmlw4&k8qN!%_r>WJf0Db=N?zYhgtHD3r;GcOo({WH(%5F*K zHZ;(EdJTgO1HIkNiFjkIx~S0W)@w5yw4;N8KTvX!j-$IBm`g_o!yQ)I zQSCqYP5_-4mU`|HX%#p@L4^>VrSYqmIpX|e+9B{>d{mU7gee!A&}qlmA4v}PNGU~L zh}A~fYGQL>pD(E_PyM~Aa(vGTu+PU8_WA2$$A0zU_3T#}xT5nKj)~v+psaJ#v%mXk>S5`~<%d=u%Q1#rsTXoswbio6Q`S;a+*Cxn z4VbV?^BwUvxeHSKgWt<^h3K?S{a)_c4Z^uaDwT5N4|Dxy(H#1X4`sLkm1UASGAgd> zmY);;ii$hS=QG>7x}|>Ef!@A@%j)Wu9qj8pu&n;_P<*hWVlW;ID$kH+YtMm+y1I!2 zJ>B~!>gy-=cj0S@ml{fhLWv>H2kM1U&9LTK>_xQ+w^Mc>`K|F+)-jCS&p^0ZtB2;o z&xO-6QAMC|8KXj3s zDK7GAi$AGh57<+is!mj;w%gdfHB*0(Ua_C;)jXRzel&Fp+jEp1K3jAYL%LczCO)g( z2)TI`oq|uXY>(SwBw5Mhpk!A^qZo<-tHfm`TwDx0cR(>TMpARge1k+{RuP6>vf=$p zXSpOebH(HU0B$@hK5ZL|EADML?YMs)SEIuF1c8PZX^F;uzIJCmQtH24SMfEc3yCIT z3JF7I%e$d?nJ->Z(dDy-HF~)xaJP2j#zmC_U2UNktxlUMfJ1vL%=xAtr480$AwT7xXZ)or<7OSc$DAhyIy1fJkVBd~^!T=>aW(>wF~S(;))V>iOL! znag<)TS#ZxXP_vtzf=!5=HJxZ6kE8lp=m5pXlSun@^OVTSaGkPUxScck&@*~%doYeOOh`>QyBgyT5x0p@F1p|vT?x* z$PC~yZ`F6$Fh>vM)aObHXOc)Ar(W?63JX0rQ$aP^&uCzju?^2O9VCbm;@7O&Sf;GH znT@tcz)-ftAs>Jz3AFR`d`n7|-5ZFMv>`0YRxT2kj?FvPzUrAHTb#am*Nt|qM%F}R zNkK6}82>XhX>u9ICx^Pl-=DQOojV44YNGa{fr8X83j&gk)N3YObS@#^fb#%c!sC1m zT{u@Eb0jR!sv&(O0KQ1ODUnKp3({x`q?=PxJ4|DWDG>WDolyuMc`2MyEaMlqlj%vx z6Lrw#5CN^=7A5@iJX%M`EY+j1$TuKUEkz5YM|$@x(?!T9gnz2_EZ^Yz(Tfj#GWEMp zKD2$+J=>ZGj(&Q#eDdVG3HhtShdYKsi88;xED;LE%YEWlsEPh+;(y_*(vL6o7&{1WSf21NbZ(H(V}XBE zK71<|s!*R-~3AS%IeM$ROm+ z1EkY!0`OJuRgCjB@_Z}B>7j1(_rZ$6{sBmW(nNiR&*6`FpVsQmb(cl^yIU?Q80rbP zj>Ss4^L+Zh>kay{U?gC;dEC)iUDRCaao8Fi3T*xZa_^9KHBu=bIq&{J+EID_rGQ`% zs0u#}vJ(D(yA+UCzuuKd3%*1>ZjleaeP`Twnb~T>3C-_pU3i%(wO{%f`$XkRI6>mC zOdVZ?QIg)(CVmGtgG&etYn3}9vHK+K3D3GCG6%WUGZiqbn4oB2$V~?>z<~rQk79}r zOu5*K?4gI^XJp*KoOUL;_%e|NO561Qtz}hLVQk5z1FfsOBC(0fjLRpxI_vtP?xcLG zxNlwC__0-W#eM7B#_*gvbHo1OB_%zpn}!$jc^riO`1@)5vDo9pnW9m|?&+G*gbR1Y zmP+{52`O{_t2f2e?;3rU7wlGxVV5@C%Dy)1g_!S69nLfP?LMaSo6I>(XCVtRb!5)h zaGwjWgPB|eK4r)0L{XuZy^+kXjYTWUp(qp<7Y#NOi&Tcs=A1TKQi}Ce3MmH7^-`AV<@H9HVAs19BG)<&ZgPl10zzu{S9*unrzQMZ#Q?aZ%(Z$@W?9yp{e89^!$pe(w}-6 z7T8yTdnvOyqn3TP4-&Df?%&h_ZSpY#jgI zx6!QTuy0bm6lL_EZ;nJ2bfC;AX|x$UTs*5?I(Y|@=z|V*&bEPxtFxNrw;|4I)(D3S z5HSr1;u(nfW3$w32*ZBTq(_f13N~NDo)W|6G!7Q?W*r*ZJ9wL3%gJw-1oCX;rC!Bo@kHFzBwi!U0u`|L-~lP`^Fv>e>HsA_&s zNBG0Ar9_>*Dch84D7RafM!$VqTQ=^3PiTZYfwza`M>x-1EG!p~CQI`3mQOAi?(geL zc6Kzy>uaOsd5iNG&*YvCvJl$9P&SP+tEG^c%r(qtSjGfBXQFaYfC+A~n(G9E3CC6$ z!Ay;Mqefo``o?V%xGtjv%8y^p+mB+x4&11TAZGzwbZ@WEYX-?vFa=|%?nI8&Gu=E#GnuSlRYX7`@;Py z;sFq!As)F;e7l-xyM_kj4Zd z0T#q_%HSvE$&27s8YC|%+iF1J*dnf`$W+czjHn8LO-roLJamDB5q3Y6lk0 ztI4fu4JQ`0m72Y#)VbMrj{R$(q10bGu%&Bk@1nNGc+mr=s=8a6dX~19cSgOqbj+i1 zotH9p?woQ@l=dBX`w(vh@BaZC5rjG3zsc5Qy?-lH{;e71zms|Y;~DRNlX?Hc?Dx8= z%=;fP3Nnl5PQe@XD)a`Y;Ago>H|2W3H8O2p3z-b52HbAP0)V=Ndq>InsK-8D#Afk} z6E)2T+)TOrjShP@%bBIGQ|f}~X_5Hao!`oIO&cMA!jD=%P)(p7`8zT#5Q0!9NVig3 zr;#;u-S!3g*JWBE?<2175O@@gt9@{sIx_#b*NKH4bS}R}ddWF8Uld#^mssJRYDww7 zX)5vG&i=|yTZ0bR`KkOnQ?~oqO>{k$=o0_Ch+;`NtNby3x6_bVmh>}WUT<4#9QlLA zk%FMl1512}4e@v+#h!-qn53aIR@%)b++#R^1TGE5zO^{|g;X^hm=(j^6(0?b^#LW3 zM4>Quh~cO|I%cH^!C<={>3@pN{?9k*nX5_S3ghRElASk7#F%stO$_3AuHj+>BdLq( zU{$d@@(;BP9e~;>evdAu1N963p=PI33o;#Kz^ugUC;rLykS2&dBgD~|UJp_t7l#4_ zdhobCH$CJmCkN$RrY{kg`+zpSO^VLN$!v>@vojfANNmrGS9HJkO%DE}2LwXc+aYr4F6T1)LK?|(?| z!TkE5uU^G%{IKw|q%#P!9!YYzJ>F_2jGjLK9vlc;lXWo7u&^3ROQtXg&x=bFD$I8B z5|f@sRwlfc@TtI=l2uQqOP7UVuDURh*gbbyk@6EFpn9baJ;;$scL}H4Mxa*|PdUdvt~s38 zj0?-Y*}+y?QcrZ^+OjX+vQRRJx8cUJ>-ptn;sbZk&1EV5#ZzbL@-k)ZP0SU1VaSLb~H=8X5WmP+}zX1u5NmG?iM@t)RLdH+Lt4`}TWeynN6 zowRVeBsB(^?sOG(23CrjT@6groI1jqHmAOvx_Fe`p8C!f7GuYxzoni|J+z8#Ox?eV zZDK1{rJi8R3C1{s^-lS7@(;m|Y6bYmlh&3d+9{^oOTnXP1z7)h9(<;aNFKLCl2JAj zOmX-f=+X(C_%f4M;sc3Vr=nPqSu$5`gr4Zo7BumGwF&nc=IDF6HrSq=&ZwfaJn9)I zOhP?t|De@CFoc$Hu=DElAT5nc)#(#Dv44mT_u@Pa>9Mp016nrrX87p31$YaK;oAi} zBPC9~CS~0dJv;sFc|&h380WX8Y<;$G(&Tjc>}x;YH+1IiXu0^+x@$)0>J;gjqQa@R z*ujD9`%~&_ZV39BVex;S;J2u>#&=m=Ci(5fKS_OJ-6L(%mDRPlP^DtoovmlDD=Fo7 zssLB{dHWnEn*a*J$!j@I&VK*qjQ50-O8K{DyeHgK-v2QDo}cNh{WIRT0Tp$^o2(7J z8lGqD)921TXNeLI`WSfVan6JCg!^$`hQpEP$aOoxgDhqv@`BXpSr`lun~lgq0tiTqJvloin3dh>_p^|rT?wv^+;yHU<}D}l|eL;a$tWkJYdQdYH+ zR)mG3oRJGPw|nY^(!X7D*2g;mK|MSp#u zx_7L%x^`${sMb?8*wC?aNsDm@ovC>J#bx>r`Boo$LjGuc(WaW-wFB|`rjkfad9;05 z*U}r-)c3`^&DKC+fD$NToz-Ox15N*5bKf2i<$31&&J5Rqk&BlkUPnRjh8IL(gn)Mx zO(Lj?7eX~&Vgd#_iKfJ%YhVCln{488Yi`&?jf%Dt?%KMAhtFaOzq@=L)l^_M?Bp!`ViFZ##GC>}Yx6)#;+{f5{Y*in)u#J$Ng;Jw>zIG5-0jgoao^% zJ5iJ+GL%F8agrVyrsYionK#x5Hss<=L{Jch3Guh@V)%C~uZGhj1z&a&OsMvqCjle! zp<&^0|Aeo3miuv*Z~Q0E5}`K(V~C{xDIO6KxMA=QE@tkdw?Bj3iZ_@i-~KwVt`Dmm z1GgW%=p06id)j|+rU(wL;lCTVr`sgd#e2lDm`DpO(Eym0a#NTp-#!wEPh}GzRVjTm z${qA@#@1z%QlIrKjfu{+n;)N1`QqFcf8B(ZjOFEw)mhVr z#Ud`{p|`gcJu@uh`1R+$b?DKg`{$)RyeuW$@=?YkOOqqZk8GN-EXX!~{@R(YqSdK3 z`w;spuk@zoO<6wUZnr!0p|pFR{#N$xO_{-CCX9#)Jvnyb*w{g-xhpoTURCh<$HC(> za+8-V;(MSi|B|$7=aSI)nRDY^yoVuA`1SAGm?wOxS&(f!A;=$*R%7<}vRm)^1a|DTe2#}Rh4**U`y0SForU87bJu-cp*KbWzDlnh)_!ZJJ&=qB%eMzCU%{wk zAg4N)O5W6Czq`N3o}BZ|<%$1sqV;L3Ry{Q1uG{t3OYI8^Us&}e`PXMINxI9HF`&1u z=ce*^>p8n5@ccEO^_M?8pnRwKul?oU)bls6|4#>$SLit#D1W@S{9ZW3i<0vb$PY0K zeuqDJj$`!Gx?@23&h9`tp61p9$q(%R)86uFD1Tb=1Lcpi9QVBp|G(Heg1zW{E#g|_ znaTI2Coh`0X!69dV-)E^)0&i;#KqyGXH364Hf9iF_xM5@tc>9d0rFdN$g;QJ!w|+V z-x=q`L*vF#8k7!%FtUG>h29LK6S7dxSOlo(cGkExU=V@THOzCI7;58fF0i_iYtt>Q zHfz+g6E~!e54&g0n~Q%iDrE3Ca|;&lxm2FFcT3u$vL8IQ@zv?p<;&k2JFj?6W^{N$ z#%kBHr}HL{yLV;K#NhDY!QlmWkB^BM?HHUIJ$I(Z6&@KqXyvNkA3S*d_dh9g71n>F zsO81g>+|>gbkW|=o|{>8WapIJtb~lmp3hzI_|n7x_t|Iw{Wy3J+C;hPoBRyV0ILZ@ z-^6EC*97&ZTz12;b%BKNxG@g6NpkF-CXabggDw)%(OEQ*e-B*cYYWibyjK9< z8hu*#T~9A@K%g@x4r!Sk&^ya5*P@KS`46~f82s?nBZ}I zs|X@b>C>83!n~hGEI8b18FH5eA<1~tG+dZ5X_jFYpJ!eCusNd^cqdF|rpU7O;|4pO z>vkvN+k4l4GThRfc7M(@YiE4Abl2J$j>zkaQwQBUWAr_zXT7k7xg+OJ9XagytnWU= z{E?PJYv)_nB`vQ!b^XcvDo;H+WtsEy!&7+ARNgB2-kM(D`|Jz;dFwvBZ{O;}fqm$E z0Xe*f-+mwZRbU_9&$UmVUqK(`u8}_Z(r2f6=Vm$hHXiwH{xLZ4uADjl!Mk$$UPSXH z@5;fAdO#jb&OCBz;;SC`g;bUU55#D$)rPT;+rFbm=T%y}KuYz2Z|Lbg5Ro;QmO>wb zixcqz719}T3@Ad&U*=9k`JiYo4ww3p-m zt8eX1FTGi|Yw}cE;%FqVd<2Ov#|}(<8G854uf0j1eZ6XU0#aY{y*GcJJ>^E~%l>+% zEd=WM@xFTQvjyBu@I1HdL0%u5d1&r!axWuZFc5T&P@?|a%l(B22tx4po!_n%=vQEn zNy*RyxzAx+oBe+X{eAEe#3OVk1WQQ6k;AL6a~m0?Y0A+!bnfjA#gyBCBT?4_zTF~+@lG5F zzV}PyU|k4CuQ=!kZ4@nX8zIafz4U7d!FX8z1&uM`;r(9%U3ZR%Wq)mfoIni`}cjzo-JHC+PQ7oy7HCV&v=(2oAk=?xp z|5p7Y%j{3Toshi+F{+<8KK?_`!cC{IzfySIv*3|apMwgUnd<*T@IRujn1a>#t1Z8o z>s*pOdlu51u3oY_Gh^1`*^8%7O^6SSHR1W66502ppS?U8FKy&d6B@7xx5l(9lIKT+ z^$sfqb6R-F7<&kO49yxu@!4##fii!!g4-XB*-bVpdQaUutaCd> zAgV8%@PV%{3JsRND;he+jv(3oZ#G#VqnwuCNo*+R%HyO|U+NnR1fUF(Yzzbnq6bG!N#3}%WG+TW z7Ii+G`%Lb{)i0edEd0y3tme;`=9aCV{P4#6J!_^7nVMr;lD>6CTI5S-wb_U3xa4SLD?JaUf28ocN6i|_75PYN?YxR1}mGd;rEpS%u9 z9{Ce~z)}O;oqJ!HoPu=%uib-AGoCjP<*5w+Mmw9|aX!bAo??IQcOK>k~(h7OD0TQn&xz-EuA=FNvd=6>}g4WnmE)sA>{FpaWm(QADfaiA$a1NY4@d$!ArH0rcAv*jT@i|msMwt zvQ=5Xi#zOBU%PtH`f1eXW31mT3mhL@{B@5HYK#8&)WGrY*#2yJFZfT$_KrE`5Q8~p z&413;m_P_pF2U)w4F2aaQI8i)iwuv59y>h7?y!xv{ds)O_|47B$Amk=21O2@?wUJp z`0SBkA$M!B-1D|iF`n}G0l8>!U_AuK7eYcg>M&cwstH;iVJV^D=@B;s2mk%eg45>4 zL2zg&1jD1Q|JD*@eltKWa)sYc?myfr_BVHw%JCWSVEsru%rM9SFy$cZYhpgMR04RmSq2TTAX(fp^x6y4Kb|Y_Eo&@&>x(%hZcQL@hlCNlS74oy<)c1%u~z!jS6EPV zhxJ3qaf_aaZ4;h*;b#8a5U$4<_^#&uw{`b*gE$wa=UJc^WbgaRcg=tyJl60kagIJ@ z-3TV`4a&!^ll;FAY6(7M=3AbhJ9_@Stjv2e(q_+?Hf0i4bB`M{YWO`v2M@wqpDbn& zpK5IEFUM+bTZ$ztoXtkW1u*w(cxYH?coM}&k=3?HukG2txctKMO%KhF z42vD%91)wcwRS^l%!s%p3A1BHUjEyp*-1fR3%7hTueN9RrW_3YTFgOff%2n#oo6Nz zoNnY-2V5&(ppHzBYpg*oLcB*AZ%~Mhj<5&Y6pzkWihGfR2n}^y z2J+a*N=O6-Z4d#CWo!(%!4S5Fl{6AT>AfXJR+8|gLL6UB2<>&=Et=SDiop)li}foA zVpKM5)^)QWTtyH^M6f&^s-rs9Sie~|M_GdUOv#i_8!0J&GigyTnxvW6QKkazomy1Eu4`FGvXIxyLOm6cs(Kg^8<#Oy5gVa{4 z<=!jm)8>X4BXh<*9ivI1K}?;(e)RxhddWoZFwd<40qw}QKkE#&$qG4~94=_7kg?6ByNKlVgA+QS{8xP8$=wu0lIh5Q^V z+_L6|VbKcGvMF;2d5M8(ePNIQUD?|V5|9Gb03N@X(wS-fSw+M>VeS{gM?{wY=|~9P zQe9XW8qzzT{PW-r>w}?58WWg#)0n{Au~6#EJNiFdh3YM6N3waM^DWh?@UXcI&^em@W$XV_%=2zIVr?5Y5b(@S);(}S5uK4g<#+w|?&P~K+>>(84~8cU|8PXr$c&NuM>$9B z9)0)d*T)2n**fOHm@7`ZbDi_s&L50@eB9Q!u(;pFzdk-cVNc@p#O4XlOq@OOsY!X0 zt&=@dHYZI;IyH6Mw47}vPV$`V>5J2Mr|-}BMaK1eAGxdfB*W|*Z(GeQhr|kGx@%UKYaL4-w4}KwBf}Kf7&>D`G z)}Uqh{;LlqPWnbv2JWn(S5RWw{;HrvfB$}Jm4Ep4$WTAL(~A2p2DtfOP$KN0_diQH zy3M;xqxBQ>QP3VU8=vgpV`g1&jB#0xnvbj#%rn*r{y*dQ8vOR8&&x3hyBe#&zsU9kBP>$jJ2LIMYx{dLx;b$e(3+c zHO<^-`-7PtG~7I3d&Fb}jWn}tFPn7h!zRo2egAtw@#X=`FU>bBKleXsJ8$l{{M@Vw z8Dp}sU$*UknAD(1Gm^(!-@|viv0IOuZ$Q=t+c~o=_&X-ocEsO_?OfYB+z2O_8P+wX z3FrSE&hP5wp1khGCkme?e7?m(%%@l;(YaX_K3;8+=O(lLiNbXTqfZs}xgYN~D z&9pX{XYn~`O~Ydz?{N!GH-*+XQ-gi(Lis;fFCf23p?Ny^eRC0?R($@-`lz z@(DTOKg_yNJ+Ll%Kd6TXSr_;`%D=FaMSb8y)^AJxS+^MjzJW+r*N z-3NX1F{}&L!@v*f;a=6nFU>gooo4$?^`&}XT@3u-{7>S02|a_RG?n-~ZJp;I zj_;H3IT$p?WCmrMOvqSmsw{Vzt>)+EdvG-PY3P~jScet%0Q~Vo_~RAxr#=tV-@ikD zqsQ_h#)wVuw}R0VwA>x|Yil-7S^hN)flkP5An%!@pZY za;`sPc`@{i<*3szivXUzf5e&yW1RAQdOw>9Lx8+<48b#DKmNw!cO(tQmcxA8_$@Om zE3F?`KeB%89O4}A9PJ$Eoa0>RJT@*C^V<9m)AMFO_R8zsYq0Zf=Sb}3>fg)a|D*rE z`G4Yn$^XsI{h$Bl^MC&2^d~1idHa(eeA4jAUw$&-7w_x*682@_GgF+Kea;PA<9uet znk{RSd=?ZqeHT{vf)dvGf)=e`Gd6DQh`no^z7;FhjP=c3JHqKp<5t?*wN797qK%t< z6ZkcJk<&Mw8`HVRg%xX@Tb+CNZgl$WE7oj438tCH`t01oOy5}F>6fiGl1?iyd{g2^XvJqtF>_YK=J68qVv;5R2uXf zhJ{JKpuRFQIqvO{pz#}=i}uEC+1R&@tJU$4q2JcxeAzfl_6FbXM{Zop+r|uzTj;Ya@R`gL=$hcNlYF65jB^8I zos2+u`24*a-VU)&PV$9KL1DxO=K`E&17+j?+%<8|41A6A#cmlnV(eIG9zMkvHrW?8 zDamJ_;&f)?Li>1&+n5&T+`D?st%W0aSi}^AEA!bW`7A@HC;1|$IA=j_lFxy1TYz}f zU!N>)nqjA8Z3{Ew(%z1=48<7-O>t&Gdf#3fz`@3}Bwy5&sdr^0`J!+0E3SMK_K2DC zw$%(9@0{w)mN8hzFWtL0J1#qJ<0C#x-24;K7R&_T1hJ@=VIUp<>sOy;@|L|*ZCkKmbDS?|!N$#~Z`*>6Be1<;Evg^8ZNz!uIdO|Orj3Y$oW-n@umzF@ z5dl#+18fvuK*nTWFpYu7;yCyV3>VUEK={dsxUp+*NJNzk;pI4Sj^Kpe%ZbatRSs3L zFD!08ep?&|!X~3;lYGN;_0Y`P%Z*vJW~ws-9v!fiK00y>lwBd@-CSW9`(p!!1K#toQU6gZCT7!~2W1 zci*8m?K1+W92&3#I3MbL@KoO*)cwdil#iP7wy_Ku?2E!aqo?>{@F#AHFLrXD@SF5X znBp5ec`xjRhOrm^@CDsbRa1T8xP*A|Nn7iqABF^Xb54c52d;ALl()lh2k5uSK9c@J ztIPg+hDLhnycuz6BgPJ>^s#Gu6>-ApVd!I^_BdX9Up0*9<&I@tQKeqJ`>${euW%7K za4yCjtnZ={r}&2S3z)z!zPllJqPFhA)+7;w;^Fu*d5Ujn|K3yhMSCY{i+fMi7I&RC z#W$>f*XjJCU1w;EyC!RkyUv{AyQ_cK6n@dJv$VxsXKRbQrcME*P4T4$?p(Mf{V2?Y znN3dII2PhY9arKTvItHzVFMmgtJmDHcAqtF;mL3;LYaIrBAOU847m10(1eghc?(e% zWW|E78~>d&-!Uig?>pwZYy|{2Bi78|18tsg>K;Ey6#nCk#;}7FL zLK`I9zZw|jKLCvO9|y*0J67fKLYJA1@;PQYFa!OGV3Vbih5m!sUM$QOE)nJlR|&UE zX0fnTSSBo&muX!@?uNqrxWPG2wCH3E?T> zY2g{+S>ZWhv+$zulC*6VUKTT5!YeB27WM$`V$v=q?PAg{Chdky+6|es8!~AZlXfv_ z7n62FChcOP&MH)PUo$fVtnNxLDFc0(rZhD_QGnY0@+ zX*XojZpftFkV(5ClXgQU?S@R+4VknXGHEwt(r(D4-H=JUA(Ig%&VLn{AexA{f2I0%XH+1Zq!UMvC!b8HhgolMkghz!< z!eheY!V|(%!qdVt!n4A2!e-(7I`2hnJ7hl&*^fi^_u ze+qDp-vi9hQCTWk>vyAMo&Ov#U%wXWs3OVVu04x|B`SBTyi_F~ZI@~LIsIBAtQFP? z>xB)%mxYbm|GduIB79%vmsH*=Y?I`6VTZ6&ctyW<3wwak;N&-fFHe*zq zF{;fNXwDMWW{hexMztA(EXzEKwHX6Xp?ub6jA3oY7}jPCyoM#L%^3I&w^^GphP4@E zSer41wHaern=yv98Dm(RF^07nV_2IphP4@ESer4hYL>G$V+?CE#;`VH3~MvSur_00 z;rx}g83PMXM`TAZo+GiS%@=@nZ99ZfsI^$|Qw5CCcC7Xp?uS$d7~HaXVJ!@xoMpBT8KU4q&?fU0{YE z-DBJz-T`K*e6Eh&AS{vux6mUjmz)ZrS6C^m5>^ZM2pc82O-Hp0JA|D;1lRj>fOern z7>zqjJS@B$m>`@aOfs1$N!E6XFco+5c#{SV<8du70O#P&6OU`z2Fy~)L;jy(d#(0g z=l=xT`PwcN7U_)Jb;e?0iOSt7f6BiU`|l8z>epS`_UP9#l{}~YYlOAJI$^!ALHM%p z73uk^@HOG=yO_6J^ZM0H@-K zHU?-HI)u?^bxeg9zYI(eP7)>yQ-n)#pP6bN!c%4{JoG2Pb^gBw=4-o9`xHsqc1bH1 zmZ;pV@=}#}v|Xm{=k#lhuvS=a(nuie5P z;4~9_-4C=29YVHnrs3KT0uzLjgvr7bVX8k3zq;VX({R_?2FyU)W*U5lC2L_b)4)a( zknPoJc+OHs<5Gfgd=X=vfF+^zDbBw>e;t(|FRm$p6nm2IABX!CIY8ey%lPFOE& z5WXyI)UoGv_7>s$DrcK#n%X?mOq(RP3p<3JLbiFPsm(J@Z63U)3*L%YOn7v%?kz}W z49iK@y(L-qmSo*ql67xM*1aWJ_m*VcTatBeN!Gn3S@)J?-CL4%Z%Nj@C0X~DWZhem zb#F=5y(L-qmSo*ql67xM*1aWJ_m*VcTatBeN!Gn3S@)Ki&~_)@Ocv!|0E`jFsw7^R zgqoU(JIOWRVqvy$i7-#NN?5M_D}-KQrLam^E!-n~L;JreJRm$MJS2QecvyHucvRRV zJSIFYJRv+KJS{vUJS#jWY!+S=Ue?uh0aH{{DXOUy)l`aVDn&JwqMAxkO{J)&QdCnZ zs;Ly!RElaUMKzV8no3bkrKqM-R8uLcsT9>zifSrFHI<^8N>NRvsHRd>Qz@#c6xCFU zYAQuFm7B|J-Q;8|(|&w`#EScjA5{}9Ob>MVE-k!{FXYD3Oa8*-M~ zkh9c=oTWD8EVUtLnOAh|tHRfWuM63JO9fXRAfG|0c>WUkBuWKWEFb0H3LGsQhv!x* zv~2|Pd6WvBxjjjkgnL3NG-pYQaG`%1wigStg-e7v{zWKXA(^?tJe9B1_9|_!*7k$2 z(p0qJsl!_TL%?a|xLqa1!V;A{tz%17QYPe6FBP>$$HMbffbgL3knkUS5?;VIdx$QKFcH~9bg75v zQV-Du`P_#+M3;JqF2oMa!FHVFu!rc9U%2EKF7*&y@(!20!=)agOFcvv+CtyK{_G*T zU|p2S9-<2)Q7mB((S`9SZnKBzGVCF`)I)T^x<1A>dx$RB6_Gtempsm;9-<5F(khg& zhvLI!edx$Rd*0~RRh%Un(q6>X?mavED0*6HQ5MAJq$R45#91__> zbjiD2@@|*B+a>RI$-7V7JwzAA#CUb=A-XUoMr04sg)uQAdx$QKi4oaD zbYV=4$R45#V`4=15M3A<<2HMUE{u#3*+X<;WQ@ojqRX&{=rZgfx(s`WF2f$83*!uA zk3B>e#u;c2>>;|;Lv-QEOCH!mbQ$&#T^LWJRj`NXGVCF`V3RCi57C9EFp)jPIk2la z_!o|PnFG7xHpe69z^+~e#t38e>nQ(wC>bq`S4k4uNONE<^}xl#Y~d1Nj{g|SS7`rS zVV=rYYI~KoS8Mx0|55C@M%zW$ngbgkK7}#SIj{lZ)B1Inwmtf_Tsl+;y~0Xim9Sd4 zNBD-$^``KE@SyOJ@GaqC;Su3cVUzHf@VM}V@T4?3rR~$gGs3gNbHZlfJKFPI;g5yy z2`}o`HeE%#@UnRB&~~S=3nl4lMW?G3osN1LgA%r))8WgAuYng6*@{kw{}S1XPB&~t zr>hm6u2yuqTG8ohMI*jQ`>++A4)1FQvK5^U@8hv-MW@5pSi)9xI=qbAY(=NTcZh67 zr^9!MY(=NTcZh67r^8l%0%R*X9k$96wxZKvr9`%((_y7VwxZKvpG3Bz(_xuJwxTm| z?Ww?UjICvW0d6~lQGWC-!9xx(M%%I4XO#bWl#CXRLpw49EWHDa*RKiMo+RW`H3N+C z*A(GGct-|on3yeGBFw?vJ_9yP$+^Njm9NzHDs8XU_Ji79qwR-LcNyTB@{6SNc4=EI zEK#{zcm zAbeT)hID>YctChicu4q`@UZZR@Tjm!cuaU)ctUtm`k&JFY2g{+S>ZWhv+y15`L6KC z!uN#lORJ08=aR0vRoEsT+J%=@;~m=W6n3fPiuUXl_5kmNg){-jaSRKV@BuJEI7yf+ zOc53ew`>1mVTnpgwOuBBP9-(MT49~AUf3XfS@^#2l8$N>UJ-T+dw`jG7H8@yoT;a9 zrk=l<}*NB`E%fxey$QiLr zJkf}p5zE9AjmR0XOgzzud|GAVY4s^)wm7nvrIEcX^c}d(k-aRi(GBFtUKZFOa%3+H zoN${Xds%3)dw?9-%R>L+1t3TEve3WS2IR}BDO z$1`$dFAMCkoFjW#h9i4f8rjRj-H*R=WG@T768_4Oy)5v|{W-Fi1)hl<*~zYhRBh< zEZiaaD@XRSaEH8%3~<312U`R_iIHG<5m@E+Ty3w%Q(zJLSu8J7xm)NFwh7yX9l}oF z63JX5nM)*diDWL3%q8d}bYLIKTq2oEz#fmH%q7sANSRBZIgv7#;!eH@Xcsz!QRs0j z#oe1&q!PFADYF?RJA}K09+kHV+l7~P6t8V5o*l$4lq`eh7lC%6L%0@tE`tqx2rN>G zTlkd!dnnl<+$Hp={Ji#W5w@wMUDzS)1l|wd>;NtnW($`H^MtE}ZwTKM9uOWB9umGK zJS;pSJSuDw9upoHo)DfAo)(@Fo)w-GHVZETSBQZXVqgVo?IKFZzzQ+2LJX`xeX*Pj ztPle$VCUQ>11n&e+@B1rKy9*w46HzH63IZW&XTLMMXfBORmn6 ztFz?lEV(*MuFjIHv*hY5xjIX(&XOlP%#$7F$qw^mhk3HYJlSEM>@ZJum?t~TlO5*C z4)bJ(d9uSi+2KmbTq&6=C3B@@u9VD`lDSecS4!qe$y_O!D*GxgpaR=Z4k4CON4pCRl+xfZwe0x4+;+n-x3}c9uXcDHVKajj|)!-PYF*8&j`;7 z&k37_7loIlVHa>M+Em@ZD6|&VLUUrQO5%kJ{r`xP#lmdi5@DWjm9SiURtUYqN@10- zTDV8}hW39`ctChicu4q`@UZZR@Tjm!cuaU)ctUtecv^Tycvg5$*etv#ysYc$0JU3Z{__ks0zMiY4- zSdXVIk@tc1c-j(qA6Sp4Es^(u^?2G6c^_Dhr!A59f%SOW5_un3kEbn>_ks0z+7fvm zSdXVIk@tc1c-j(qAIMkz=F2kkWtsV^-+Z)$yYVaQH(&Le56!vF`pt*tMAmOUTASRH z^_!1AHIen3k3Kb#^_!1AHIen3k832de)DmSMAmOUu93+4&BrwoS-<(XMk4DsAJ<4^ z{pRBuiLBpzTqBY7n~!TGvVQY%jYQgWKJNV6Oo3Wc1!_$ds5Mof)>MI7Qw3^G72tY5 z#hz?U6{s~;pw?7@T2lpTO%MI7 zQw3^G6{s~;pw?7@T2lpTO%MI7 zQw3^G6{s~;h`U*`-kH&=+eA0=>Zt`K)WBIo7`VGl&k&0$50kaKf|um>XN<_a|`TZp?QkK){1 zA?}t$&dn7;+toluCl;aYcO1y*#3E?Ra>mpZVPs-9kkN@n==UT68J$>!dOQeZbYcWa{cBQmD02>MepW9o{aKanwYMX+ZgW9o{aKanwYMW|Uy zV@zEUYL>{Dx+2spkuh~es97Ro>WWaaM8?z=p=ODUsVhRw5*brhgqkHXrmhGzOJq!4 z5o(smn7Sgg1F0=z>WUN-RRjwsKa8m>LfenXn7Zw#eInz3wxjmB&G?_~;I;tB_@C`y zmA^9nXFF_Q9+2@r+hGIEK*s-UhYhp>8UM2#^-c+l|JjauCo=wLJ9r~9{%1RQBQpMH zJ9r~9{%1StozfWpvmNzLWc<%|)IPTv|Fa#}QecXud9gGvmgdFMyjYqSOY>rBUM$Uv zrFpS5FP7%T(!5xj7fbVEX^Znk1LVKmB`~ti9D`E z9#Q$m2@naV7G&5_wz+^#9nD$m2@naV7G&5_w#SJg!6@S0ayd%i|E~1}k#Q z;}EH&ZF-zr9_NTOQ|@$GPQk zZh4$r9_NTOQ|@$GPQkZh4$r9_NTOQ|@$GPQkZh4$r9`_WOT!j(ISYf;n z%T-a*H&QtP+vt@7%k^u8&?~GIRtc+xdxVX6-`5UF-XY05P$R2QLdiQMnWLZFhmvO4zNn3}+l|ueyZ1XNrDqky=ua(NzO66;%^0iX=TB&@k zRK8X!Un`ZbmCDyj`C6%bZI?LNB~EsUlU?FumpI`l@C3{Rkds~FWS2PEB~EsUlU?FumpIuaPOwrI zM|mK5HIN>Gb*13MBaiUlTrB4^$Rm&7DD!k|(<3nf9VmC3rwWL;<}S6!DwB1U$-2s9U1hSaGFexdtgB4cRVM2y zlXaEJy2@l-WwNd^Sy!2?t4!8aChIDbb(P7w%4A(-vaT{&SDCD<9Gd4~Z9QYm%Aqrn zBT?lVi7MAfRJlf?%2D^3DCbC2xkjSOaTTabjYO5>T3*05N21DcE!%(`i7MAfRJlf? z$~6*Iu92v6jYO5>8hJ*JM3rkKs$3&c<+y5=b0n%k zMxx3!5>>8|sB(=&m1`ubTq9BC8i^{`NL0B-qRKTARSvGGEk~ltH4;^>k*IQwM3rkK zsvJ!6j2ww72ZuzCM3rkKs$3&cl(d{&6h3h`MXJ}bm$h4`!xpB3V>LVQ+;&kFHbAwDa_ zXNCBz5T6y|vqF4Uh|db~Ss^|v#Ak*0tPr0S;l( zd{&6h3h`MXJ}bm$h4}P}Pp|m&ichcj^omcf`1FcTulV$ePp|m&ichcj^omcf`1FcT zulV$ePp|m&ichcj^omcf`1FcTulV$ePp|m&ichcj^omcf`1FcTulV$ePp|m&ichcj z^omcf`1FcTulV$ePp|m&ichcj^omcf`1FcTulV$ePp|m&ichcj^omcf`1FcTulTGK zpOxaXQhZj5&r0!GDLyO3XQlY86rYvivr>FkiqA^%St&j%#b>4XtQ4P>;FkiqA^%St&j%#b>4XtQ4P>;|0R*BCl@mVE4tHfuO_^cA2RpPTsd{&9iD)Ct*KC8rMmH4a@pHqntQMcu;UsO2hKZyjCtM%&V4|} z%0Be7Yov3Hbgq%kHPX38I@d_&8tGgk zool3XjdZS&&Nb4xMmpC>=Njo;Bb{rcbB%Pak0B$FYo&9obgq@owbHp(I@e0)TIpOXool6Yt#q!H&b89HRyx;8=UVAp zE1helbFFl)mCkk2xlTIQN#{E0Tqm9Dq;s8gu9MDn(z#AL*GcC(>0BqB>!fp?bgq-m zb<(*`I@d|(I_X>|o$I7?opi2~&UMncPCC~~=Q`v%c2-zXy>zaZ&h^q6 z*~(Q;d#;zx_0qXsI@e3*dg)v*o$IA@y>zaZ&h^r{UOLxH=X&W}FP-b9bG>w~m(KOl zxn4TgOXqs&TrZvLrE`OHZjjCm(z!u8H%R9O>D(Zm8>DlCbZ(H&4br(mIyXq?2I<@& zog1WcgLH0?&JEJJK{_``=LYHAAe|eebAxnlkj@R#xj{NNNaqIW{0g+aYF>eE#CRd2 z`(A-$qF2c1zE>cb$mqUTAo;3!RmZ-nV_(&=uR<%9^VnB)?5og<+dTGF9s8<|eND%{ zrej~zv9Iaa*L3V_I`%ak`)1xc=QKhBM{pRQ)2R5IM)dx$LIZc;93bO!8X=$iFg~YI@i~o%%1FjG<8vBuUjEAX zoJKt3h>Xu^#50cDjL&IAzk42#@i~p?cM}<((`Xo<)2R5IM#bkeq9@LB#^*GmKhAB& z=QJWNk=u;VX+#v_t3bx*G-5oJns1l3jL&JrvybJB&uPS1P9~7?IgN_XX~c7c`!GJI z5&d}X!}y#=@W!iPd`=^HBQidx5xfx@pVJ85h>Xu^#Iusf_?$*OD~XKHX~eUV$oQN_ zi~vw)#^*F*1c1o+oJNcQ5E-A-h!FrH<8vA@0zhPZP9sJDh>Xu^#0UV9@i~nc2jDj2 za~d%YKxBMQBgO%UjL&IA6e9Ozd`=^x5Q&V>X~YwmS}{JS5zl2_HRE#{5z|E;7@yOK z9ye>8@i~o{ohLFrrxDLt?#cL^Mm%S8kiCe{+5NDekAZy7?w616myaXcwaR&4+Akm9 zFCX78AKxz@-!C8EFCX78AKxz@-!C8EFCX78AK#DKp&UME_oH@*e9rDi?GX8#-H+NK z@;SR-KE7W*zF$7RUp{^qI{VCFXiH?o#bId6ZAM%i)(rAt=)i48TpWfDL`Fv(hD;)( zBMw6*k=a-Cc>;vw^SERlm(1gmd0a9v@1cFjCr0dq>9+%AHl6ev` zFCudW<3LVA8j(>DC(+{l5Xd-?lhBRGD2S72*%BEAaT1bQ&M1hJXoV6P1#uE*AueaaY~w>lIEwR`6+3BN}8V%8>giCDY0=%nxB&9r=a0u@mR*sO*CvtB6JnsKQ&aI!vouA0L_4By%6FIkj9(R5s=hn~T-cDrf#ChDe z-R6QgydVxQh{Frw@PatJAPz5x!wcf@f;hY&4ljtq3*zvCIJ_VZTf||DIBXGzE#k06 z9JYwV7ID}j4qL=wi#Ti%hb`i;MI5$>!xnMaA`V-`VT(9y5r-|}utglUh{G0f*dh*F z#9@m#Y!Qbo;;=;=wur+Pao8dbTf||DIBXGzE#k069JYwV7ID}j4ljzsi{kL2IJ_th zFN(v9;_#w4yeJMYio=WI@S-@pC=M@*!;9kZ5@a4Xm%!v@AZK6kfoCG;e=mV&BIkcE zfoCG;e=p&=Nokz_y##HEod3N9ow?2V-%A>MZIFNIxZQz;ZoH=UK%n>8|r(>HlM{SxpYSYY78?5>u zN*KM+rkSHQ%^bC9=BN#=P|9TVLL1tdL`E;P;aVt}Ge>Q>79yh;+HfsIMlZDCT8NBZ zXoJmDKBE`fG;`FZnWHw?JWCk8(59KAHq9KhY38U+Ge>QjIcn3)QJZFt+B9?2rkSHQ z%^bC9=BQ0GM{SxpYSYY78`^}_meC7s;E>EPdZ7(%KbA0hp$%<6JhR1QyO?YjlkH-% zT}-x%$#yZx)e+ONKbdS7lkH-%T}-x%$#yZ>E+*T>WV@Jb7nAK`vRzEJi^+B|*)AsA z#bmpfY!{R5VzOOKwu{MjG1)FA+r?zNm~0o5?P9WBOty>3b}`v5CfmhiyO?YjlkH-% zT}-x%$#yZ>E+*T>WV@Jb7nAK`vRzEJi^+B|*)Aq8!<+V)%kU#2bK@W%3|87+Hq54i z)&Igt!ek+{sa(e0U>1p4Bm(kN9GMma}^mK^Krg9lQ9U`--T!s&Fe`Zs; zjCL21*;H^}Q8}}zT!x2IGP9{%hHny?P31B;;jhf5av7X(RSEsHL)O(H>*|nob;!Cp zWL+JyF0Qwkjy-8z9kQ+tSyzXwt3%d>cxU)ahpekZ*3}{F>X3DH$htaYT^+Kn4p~=+ ztgA!T)gkNZkacy)x;kWC9kQ+tSyzXwt3%e+A?xapb#=(PI%HiPvaSwUSBI>tL)O(H z>*|nob;!CpWL+Jyt`1pOhpekZ*3}{F>X3DH$htaYT^+Kn4p~=+tgBN@c8bYPG1)05 zJH=$DnCujjT(dMC{XH_-DJDC`WT%+y6qB7|vQtcUipfqf*(oMF#bl?L>=cuoVzN_A zc8bYPG1)05JH=$DnCujjono?6Om>RNPBGajCOgGsr$xboZDJDC` zWT%+y6qB7|vQtcUipfqf*(oMF#bl?L>=cuoVzN_AcF9k>XE^wO;IrP&m`DvH@ zvXF8OH}c%U@;X_x%8 zOMcoVKkbsAcF9k>0mT<~`E9 zN1FFY^B!s5Bh7oHd5<*jk>)+pyhob%Nb??P-XqO>qJ<_~Kn)gWa9%2o-qsYdCY7`JP0{%NPP_F zdIEdTK(3P+I0D%d@a-Y|`XqGWK2Mm*y&64+vTgXa7;%7GQ2r#gc3_W9_||upq?`2E z1{qIb?>Wf8F%A1~!rqVJ`%~DSiqB)X&Z&^%Hjm=>2h3u~LB?_a|Hj9Sy>9p4FOcUP zFS7)bK^O_fTf$Ha;TQ*wKz%sOAY|1;7CPjx8jKnl3eN8`cbj|g9?ubGq#1>`R*%6I zjMeJAc)SNF0a*|xAoI>7T;&uzL#9Fx@|KKD8Y#%gFdHL@X?W7i0WTR?$;Z`UbIm+6 z-z-3V;AIdd8>@|$njEa_S#Ivb3Y`bQRxa#erCEj57!QKWHCWZK4l(li=3&Huf5U9R zn-FZ~P2t<;-pBhkes5mK znB5=Ezak6#8yJ6TH9s>yz&koNnHOOZ?WhCvf^h#s8wF3oe}WDEHSQhV=7-?+cjhJY zq4_W7Z%}{#Z2kvk93Kbwg@}wTLOt$B4SW-|LVMT&)_3AfeZMx}f|ZqGycy9@=A8My z`3vNE-))}7dlG+Zn$6!DpLyF{#oOxt&YZy5)ERTuaCGXl`KhTk@1Ym}t|i#~PxRwk z@M5V@yqYN7Vz)#D-M@PI^3WYmJT`s$yy?Av7X~fb;V!m6>fX3>%hXL9pWNcu{MZ)v zmM0&3Qs3+wH|=;T@I%z5$K0ECY~Nb6an8Dft_eGeA{h|2}SPt zC~O;8$8^+|b>ZUWtIVLHjZZxRdtmN*gFX2BjcpuRxW)a185BVL#^3RlSK1~1^3}^9 zYX7a#hoTQfJP~~;#v7X%;|)F*Wsl5rq(s>*ha3fAtE}EAyDbNw-vupp6a*g&%?w-R z*b{a=;)%$-=%VPN@NH3E`y)}_D6hW#Agawi!TyN-a>Nr+_UJ>gnX#Gt8#yF$NNi^0 z5SB#Zo90k4q_TU)E4*Uy9?*G;nT@-~6B~$YlZvgo{HWOF172ZTILgvt3 z4~j#^G5QBGRmm^XqH9%~$6W!rVvpil3RRUtMJ@mv-1fht(c zbC^-CF}3i9deeZ}saN3*ucM8%AEVVrO_MnWi$5v*qNSaK1)isE!R9W(6WU<^0lUZ3 z9yX7s2c9&HwOo!T%W^zdJeUQ#h&iB(@cbco!g!Q@i@CR$d5d|sn01Rex0rE@`L>vC zYZd-7(-!k=G0PUSjWE{;GmS9M2(yeZ#|SfwFss&^_%Ndu^Jy`g7ISGalNR%6F^d*+ zXfcBp^Jg)87ISBv!e8diV%99?%wonY=F4KXEau8$rYz>kVwNms`CyKZ8Orp;JWtH> z#C{huJSE`6>`u(>#LQ02>%^>1%<068PR!@TY);JO#NHM2I5CS8`&DeMF@F=YH!*h; zGdHnc#jH)t*~Io5^EEMB6LU2&Qxo$vF-sG3G%-UH^D{9!6LT}M|HM`qvobL!6EiX~ z9~1jb>@l&w#EfY>QAZ0eOyCbTm%0*!T(P1 zzZ3lL1phn1|4#6~6Z~HT|JT6(HSm88{9gnA*TDZZ@P7^bUjzTw!2dPye+~R!1NYa! z{WWlZ4cuP?_t(JvHE?|mTrU9E3-Any!^~#_KFn*Gj1RL}GLH|l_%MeLGx#un4>LeA z|0A<65|YeKJeW4IAAG8{G;UO~hF_L+QbpIXfAc zn`Ay7X5(Ql9%kZU9v)`lVGbT<;9>q9X5V4%9cJEP-W_J$Va^?9++n^QX4_$|9cJ2L zo*ib{VU8VU*kOJhX4heEoiDR>=F(v%9p=$t79Hl$VFn%M&tdi)=FVZ}9Olho)*R-{ zVa6Qh%VD-0=E`BF9OlVkmK^5DVTK&$$6Ft-dd%P_ADv&t~1%$M04 zvy3vwDD%fKdkk~OFmnv^#xQFPbH*@Z4D-b>TMTo>FjEZk#4t+?bHp%14D-V@Uzq!anO~Uq1#8E_G_$_g z@s}B2nD2$zUYP5JnO>OZg;`#h42O2~mN;nm0W|yo8h!u`KY)fGK${PsNfR__f+in8izaB$ z1Pwlb1|L9!51_#Z(BK1T@BuXV0B8OHXKuoon{cKkoT&+CYC`*stM|EfpDXvdZlA06 zxn`d$_PJi4tM$27pDXpbPM@pvxkjHW^tnEttMfisI}{VMAHD(d|z>isI}{VMAHD(d|z>isI}{VMAGD(d_y>ijC| z{3`1FD(alxa1|PC!HzFzg+jrRli*G%N4&|@5|M`TZpTqOj@faai7N9s6E$5A?t(Q$;1<8vIHxL$*+HJCMoIYWBz z;d?B0Lz~^uW;f2h8)w~(BX{G--Pm(C_S}sWd>FmP z*tHF~Kd_bW#xbe5M=Woe`AJVx8lB-m5DK5jQC=_7o)ux>%~Yf#(6Qyi!ok| z@M3%yqq`W}#mr00yTqt2#&j{Fi}75H=3*=tBe@vI#V9Vua4~|5@mq}EV(bxGUNP>9QCEz)V#F2Wtr%^^SSvW1F`Ki&Pf z8q|$v2;-C(rNkH|Mtm{ei@9(Z>&3Vk#w9T-i7`ox@M3%yqr2!C%n@<`9>FKj0bJi| z)XQqknsCm9GbUVH$d!eh9p>CHXPmgIoom`TC(IdP&IfZgm~+9L3FbU7XMs5f%o$+L z|8n-1bHAMV<*IeAS?8QDXMDL@oom&(Ql0D6xk{aD)VV^P>(jY9oomy%GM($vxhkD& z(mAKg8C}ljayFN9xtz)6JT9_4W2~QZkDPf7^nY97+pX|zk@` jOgLaHjN@g2v9RI#YsENhB*w+87z6!V-~%YNn5F**-3Bd) diff --git a/www/bootstrap-3.3.1/css/fonts/NewsCycle.ttf b/www/bootstrap-3.3.1/css/fonts/NewsCycle.ttf deleted file mode 100644 index 9ce66cb52c0ad852f414835c432c00077bf640e2..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 28716 zcmch=30zcF|37}ty)(li%M9DFGcX8~?C?KFH3c069gkt4NJZk`41B!&aSDQRJQZGH$Ng|z>{d>;PkTjb%HDT3h{cBH_RxTUa7kswGrdN z_^F|;cGm3hi?i|w$vBDel-13wtb5>{i$4;Qz6a&E5P<*=LWOz^5s3{UF}grq&p=&Z zx?qrk>3V63dd#ht(p8_JTrtYuP(N!f7Z>9$#)!t^mX;R%l$I9tv$vPaGRaVR(A(-~ zwV}kB+Nrf#8{$le8nZ|JbwI#+^;P0S0tj)9i_sZzv;OdOH}czvm{Dg!|Ld+^z1m2< z8-GV=l+HKeTRKlK)YFuD`l%Gn?t1C%ddZVsU^mjyhe$Tcy;XfQzN8N^k!17|n@mj@ zsfXU5>TNd(2&qJ?6glOE5tJk?E(^%we%->Soe5}mY zMVPM*9$c2Ux^UXa!u1oIx6k%*beu~a{q?5G4|0c6QWIe4ThzR~Y25TIRYT6kx!OLF z`WGFIVrooSmP`9_?|$Q^zFzWJ(ZHi8jSGEUTylNF^(JqjJhx&zop#@rLcd-?^v~O( z(DMD#NDu`8Mh0UtlKL_*;!N~_myr;c*!XA<`Eqq8xqt#Zb$WWQRy0RRv2<3@Yvurkj1~k_d$q22pU3au=^3c2J+yonqGYw4^ zT(klxsd)C}iA&S^l;;M{4y(;cNy&*$)`aFZ{vdrJeYHyZbj~k}Vsn$ud_)7Nih3R{ zo6Fivq0b9-;+w>YwW$Zyn)Eh$n^2ojQ;OfG#h>_nvN(G&{s~_c3_f{saKYf6rk(i5 z=!KGOIz>!Vm69H)8^<^*(4BEoHcf1#3DWzG!j?vwD81Jxy+;#S`3zY@ZjcsYONibC zK6H1YHW}jvwfK~aw{EqxB)lmqFeO3{fd~t=8uC8xhsyxeLv{>mG4AK-8S>lW22F34 zt_K}v2p4MFy&N>An7=+mzCiNi-&6tW8^nbKgOWpHlSR&T?pn1bD2lpjK~2%7co0pL z5E^1MO!xE6oWAS3=c|narGJk3c4uwW)X|%F4eR6JV(-<@n7KmQOrQVw$75ftpEzOt zlmoxFA8U>*S}Tas=Jg977+bcst>wwNeahK9r=s&ez(@9gOHU?e0wHs3rqZEPziWT; z=2i9lS+};XS);$0YXmNy}LJ z)MI(07kxaV=FNNV8Cg{7l_G83xW){>-&8uK?-UB&ijLQY^aiIfPG`N_geFr1@0_!q zyPL{r$f%6IXKMQg+t(aFe*f}kmTY>^S67;Kp4uFlHz^`=VM2m*^R#sC>bUHogPx{d zt&6taT(ij2y=3&9s-2Zj&x!RLRy=<0=idQ0OEB*jIE)+_^-x6|8`(0jM0j}jPd_!c zUljCo`F!zeo4#IJK$q8xiGbHQ`8V+^)PrndJOB(bwvUSq4GGfNK$3$3fzg;~EPlqI z(2#NEE(2yRO0LWBNqQ`+b%V_V!maiV1IxpEze|bq=a&apXHvK9{>k$bQ^QN2zA?Jj zl76CBy%d}1X)j%u;-oLu4Fiu?gO2p-OIl~*t6HKybBN)1G-Tx)7zacaXy2V0>1eUK zedjh|qPq0K)wi~&O95g~W)a-*fqSu50y0|*2*@%PV5kWTC zCkVW(sm>a?I;ZF?rP2}UQpPs_#JSU6yXi>vx}L!%zl;$_CAs;NQmNp(OW_hE!pH~4sQ^_0RezhxBLE=jF zcGM;=uB@wV@PalWb|Rx zo*fOfqb6~G+dE0Zm+et#u>E)u{epf`g!W26Br4F6C&3~N6#&fc2AQt$qsF+{6v~hf z$U<>(FNte8zj;hn%#`}Zg;fhzt{&AVD6d5wR8cvjb??*33sz5f^wIjY_pZIr5)hkk zJ4l%qlYwj1f2re18p&2qUd+DPz^S##+a%yU+TTkEAol}!s18a8f%W?!G&EiY|4n(A4w@%pM^_j-CJ4On?q`fDdW-BOk_YhgBx`>^e|tqIfiNbl{FR+Ra# zn;OzvA0Ih5GW*RVb5nBK*Ty7f4wy@OQ~UK}YJML7-H8__2WoXis<5cB4-1!fe%$a7 zjqcC*Odwv6CnEtz8zyyQXbd%qfud`m=tWyk($)?4N#e5S=)UjOmv6b#(^8O7B)X!W zNSaVD4E40o5JON?7Z`0(I`GyQdj>|EpnX6f2F7)MHqmchyS6(ZYFmE9rPI;@I%I3M zA?oEd>}yq~f8@GV(gF45FE+?S9Ua4;7*liLOntgv-S9OpFCOYQcjTM}ppQKHXH~ws zjYM^xY_(b3CGYXx3}{_46M(Nm`I!@^x!@ z`Xeeox5&us@XD{&){ILO?4LaR_0g8`{c5r11@V@$TeLMa=x2&W5L6o=SqcE56C~Ynqq_mwUUsp{4{2~?jVabe%hA6d(Qt_2Q z!vV-f541t&hkyl@&*|ygzhuCYL#yl8rmdx-t9M*r&V_A}1OK4jSQ?UNd2jBuO8y|A3}v6xO%L9eOfYTfAPGr)r{Q zo|q{#A!buFH4ClH&Fy*W%k8zo+FS0z>2@}F4j1Z!@=TvW*`{Vjl}PuJuM2-6-Hkvk zW7Y#WFAfF3tDHr>CVQs(6vr&6ZvJM-^NquN!*0f<4)E&r+y+(h?RTX8<9*`>_a0~- z&-l*q&=@-`Pol2rQK9;2DVJV+R+{*y`f}R`V*mE{+j7Nt>2*nG!58S3$v`%)KzGbw z6UMfcsS9X#35AsoLefH|hx96xHyydQ* zfW;8EQeQO*^*MfHC<7DKEx960YF^yl7v&pN_n~~jt>;0L48KnUzpjict#vnLrF3C} zNm=?Cc|wdW2oD*%_|Q+UFAN{?LGv@E*;2bBb%iQ>dX7f53gM`tUX8UyM_j@W^<5!;d2NivEAkX z?qVx_AdDHt?{QI7xMM`gz`<)QqR7{}$UHlIC8-i60#;&OMFkmfXrY|0G zv5=|J{z3q#+$Ks5|W2yJbanlX46aN@9pe}CP zs}GJzclL7>?-QJR`1tklNgK6rLwe7cA%;GqFN_XqAfv_2N4S*l} zgdjD9hBP&&joL+R`#C&TIA8irdV5ABeP0!P`@089=3XSU;i|Ll& zU94qZ8|WN5XM>cy0c_%_x&U#Zl+(na9Qe_dEqTht84?vld+PEcb+M=72AC+)HGApW zdeqKWz0B@g?(D7bHJe`$+JPO%y5s+hcGQc$DwS-YlWFk=X*7M|N$GLvaZxRtZ(lAf zXcyaEg!*=uc zyHChdaeYcd15&36 zvoUg-W#)+smjxQA{2`&-I0QLs1A}bZyq0-4x^61obJCPLH*IB=ae#m2@Q}IF0#c+C z_fLIxgM(?jy0HDlUNzFuKi1vfk`x$bh~N64mt#u*dv?)-j{#2E=ySL#9QFlq)v|f> zgK<{eI7TTW1!=>-_aY6CaTNkbW!c z`&LS3;*7CE$fM=?Tj22pOkqU}k?NaRFA2q};zyZx6IWaegl&AZ5Lwvr^UsYtcC1c& zLVdZm;Y?lINO5P~nXL&B{Y(!Imj;WUs3J%r$t7dWs}(a;;~}XPgB1{C)QHC2nNNVx zD5k>1HZ)f#EAAkUJ`9%8Y|gP!BFlC$`wbV4^dA_RYnwmX$0s6DOd3D^we8hOIen93 zg_mNyK6_@|cw673aKpsVsJabh3#Gsp8nsi$KOLJNo9q&vw{ZUS9@7l@sjGfjwD6Mj zbZt#iU%ybbZtT!Ruh3v2=9zb2E)VaOZ0AVl2TUl8+fGZDc1r<(O3(;k$Mha}&g2C8oQpo)S)WY5g7bj{=(>GJQ_;k@p#Gs5W1gIr6p`}=joJ9ry5%u-i@iOz-5M%{gw>`_7hc?b zW>a}U+~a~{eqfRr$3m4E_I)kHu4kTDjg4-8V;`^bCmlS~i+X2|RRu`@m=d~PsIvNiA7{7r}f6hHI+;~wmmdspUd8zddX-p%Hkd>( z>tYXv8)pW&!$*56#YFkt%IFzHb9Zj92J89V(_yRnaOAjX` zq)78@@6`qL8{pqRP8HPlj5z-G=9dPhb&N^4fi}D7cwRzZNiA$^|3K(JMl7lu*0z<2 zP1s3ig?#9Ep$vD?%=H-uVseK=7t0HCjxwJZb40nrV};c$E;jFN=g7V9r$OgP8eLjC zIw^4Aw6yp4Mmh^s3w{gkSzEdD-RkJjypiso99t0-wBpz&Nu!5HSHHWnvbJaNZ_4;8 zTNvS*v^+GDAdNHwPaUBMob!1KIplW zNrNgPA}R)zr)?cvUR1EGpx}Obqat-%8gl#gL+0S82P3y{-*S5IeWhhfN-;^rj$?L_ z2jgjG$3Z5!cj{%BZikh09ijQ32o`Ip_~l~hOB#h2gO@-$=@rt1Q7qFhDw>;{8%6uJ z-^DeeuI*=5j>~6t9`+iB-YKC?oUxd~eW#Rmvrz=KD;L|?cwl0kb{E@`k^e$)hlMfG zJ<1-U{Lf?+B>m^z#Q2+oQ*xL7ttfwbaLO1+bD_;E4e~v^r{`dZ|7gsqSoI3*s;o}k ziuwJETV7~Uy@IVkwihS@uP)*rsy88Pok?HFF)cB`r)vtP# z^ap;Uumm9LOmOnE-8Rs@9~5X~NGPOE9NXH}xY5Z;4<^+&^(^oXb&BXabG>7lV}0-t z*Iqu3LAk1`;UlB+a(v?YIJ^1zkAL!Fl($VpAAN(pM%BZMEkTTKRQ|$4>Qk_1u{vOf z7bFhz3eO5=&kl;>PgNVUaR+frcMz)w8<)-y+r$uV2Qv?IjyRI3vcl+)n3>n%<2NCyT%f*G^Dtq*O+mFb(Nhhu+bYsjqdn{lf5?u z9uB|zKuY%FZ=`P)r(dJlSFcFBHD3+NjOov-Syu7CWC2YJ!RimgU>G03_B<91EZWMkfp{+>{z-pEfc& zyjOO1daoe^979~Z2C1(PTM!(+V#vr~=cv%(eNA~j;i0-PcfBuz*#gy2`ls2CfqnG_ zG<2MFMD+lBLB_y_kShOHHwp@cO~DK$t{W{(kSf*tyQoIq63k1Ho&VwcxH@oxPp1aV zJ<6cApb%)k>`)9;t{LGzDUp@W)3)YQ&C@nLwtU%~=2NG{g=?2ho7$@wZgn^wg+0TB z(JQX6auXukKN3#3M_cL^seL$xuyKW;;lx{3Fhtur?}*X{HPw@D@SBa+<365u2l5N z^z7m7OB>tz@}a2rbadY^bLhyDB%@nY?-djKPi(9&oIWl~@JMoZG6ebMd6~ziBJmj8 zgM4g`7+Wl~i7qhcY0Vel56&0N-el*B*v7jth{LA512&8LYv(K>PIoz<%!QnLWH=+{h6%8A;v=;e%(7>eDOH;Fk1lUE5`4kd{5( zZxl**HN_8vBH+e^J2Ow9U%}HAqQ$uj_fu7i*xqh^=HywSMbUd_wd|!OEyAYxYp}OF zXWfEFFRmSwn^017ibjb8*t&9UxMDfakhaFv!6%cgb&y%8?Z)r`>_v8TZ->5 zDY^gPqsLmZ1H-6!KXwCc4GjvxrmT${KN=?e$&Q9)2f8R*wCc+)fo(~An-=`V?4vgD zmoxX$Ful<14aOV$ygDN`dR2~=eZ{tCq{pz|JG7=_gRyhdm)RR{^S##r5N2i>09{AT z&j>M%t6ta*k=v-Pqt*o6bzQ$WJ*mD#x=1}s zaMJGr{TOkt66q&%9NE$ZCVTTB-=5Prg8l*DoHd%x&#mp5Kt&<4fmrZC2rSM#f z8m%h?3UefBLpP6Pn}>5>ZX7nVEIT)3?4koRcP`7BRW?lMU-pnBSM-0O@}a^tg?@1( zX+PSNIu8z(<#E|}4n_I!hQvP!zNQ3{aGmX2r``#62SRiO>G*JXxh zGKX9LZs~LA$ve^&c!qI!T9;Sg=FQ=zq%+x)rO+OIfwu$K6=(^(pkn*7PRydhdVIH? z*=D-vE?cwGE@g98dV>DIH)lD1ns7F2IBZbtQDT#w8J-5Fk2<&D?cOJ^KusLQMy1@^k||!<_A%gL@`)__CxY(oMxUAZ(W^~E#I0X81?uFekbqq{h_a;K(_G+BAVrYs(qVDL^0h#XZCnw>W9 z$2O*Nf|mK-lKOjX2pN1J3Q`*SRY!U*(nHA{I+mDoI?5mB>%g<5zfz+ky$0=+jn3-U zPL4W}uLJAlU%HmpG$Q>T_@rMl*AOwDo9bubCyXMgBnxzV=WZ9Q9lZzN6=6OWZiX57 z$zJo;7b9eDu(HD&JuUkscW#7zpFQRMeWiTwRo>F#P zz}wP$d=CrfPde9-5NweB&2|>%z}64C8SBT;{Szkti;b=1kX}P@WR|TNMUIPBwf)@| zm!FGG`Gi@(8QbH^QEAOTm;eyx%zkSieYR>GD5OezW>8XlT%bjIu20Cy~BGp&_}Rx6g8vJ-Vgf zYaiwT#0dZhHy3v31si}`7f=bj$vBUULu#UxmtSy;&fXIB#DN17mcDc9o5SnIjBwB$ zje0*}y0E{)>#x2XP&^^8NIC|`|7)v;&`5fo24#He5i~n*=I{!kt*3N^?F1xLG|`s; zm-!I5#cEFbrHuARcEAyP4hnpauzBWpOK0$%$l-z<4qsMYf$vTZU+Z+FT)xuTTF42bWs`}>ew6T3>Ce8Zh?RgWTXO;J&^AdBV3yTIl z!M0AKo15ub8q{}m+SF!AE1gIgmqu@_uNGDWwVjS-nafyH(X3nkr)`KUP!&Y?-X9p-E>@7;iQEPFS~?%jW}cVn}x z{o#MTdBexAj3)&&Ufu9J=F43lSo4=MUV+~mei61pEp6mGfAGr@qM3+{1g&zKX|8y*L!))Zk*4b2XN;`biDm_Mn90j5@c`?q_BzYmciemhpfG0KN?yDJTurCH(4Z+azwePlTeRA^5{LC(U zaMEj*ZEVnm`TPYSI*8#{28JmS7AtnOVqIuDevKl*plCT3$Bhf>Vg17rh9l{7G7s8K z8hkTl(%d%Y5Ta<3|F(ePM+bhw?+kk2@CHv;;Wr079f(npHpJ=}5%WA-t2|rsr#TPf z#cz+;?>{hJcnLs{=HDXWEQ}78GC0+!Hv+kqkBpW<<08cJYs!l`;ctm=Ch#Y!EA6r0 zGNC=S5|?Fqn?8g&d`!sgi+nuA0;Nxj>3|8_Ipm&(eZ?iq%E|;K84>-aQ~eiCc5(5i4e0{jd?KN2Rn<&d<&Qd{4mUU&HM^+6-Tqv($ZG1 zRxLNtDCt=L$&>q^S*13Y)`Q(u!V-Fl?pX#D>4KEuQnl>hA z;?Q{u7Y_4qwd>(IFP46&)4B92ZwR#Y$(_-eu_Bz7N}GGHSkW7Yn6?#E6!$8M$lCZ? zf=3j6OG+Npf88)+mZXo3y?0#I_+CY=QTNv7TjfB5hE66n39kYMY;9pyHS@!<-+YC_ z&ges8n8YwC`wU)`uRLt^33T_uPc_)ygX_P@%kuN{qjAzvotmG+a7C zbJ$aQ6nQzy-QHxCzQ^kOZ^|%y3XDR2PsFe@F%M;A)=QUvc2AFbME!oGUELz(bc}LB=D9d;srQ-q1npu@JC3lz5A(jD z_c55nmX?0dzYsaJAiz)KM3*$S@l!YX7h2Q{sk^JzXgqWKjJT`g_>CRgzrY;O z?w4qn`9m4^C<6|l7(Q#B;zUoN&T+?m@|e2^Mis{n26c?q0-3;Q4=ccoD-S+QTMAqF$Qg8KY<7XP!vY;! z+7jB(F#}~5zxR?xD-aUdJXFE__bwse74#gfXZ=_%^Km3>FZzoeovPvFWjGoB?xMz@ zaqZZ#DXY@oLGK-)agbi*J=0k~m#tC1A7yWusM7P6L~lV*t6fDqseq3FlW*X7BIJAg z4$BGNEQoIKyufTmh;sZImPuCZbt_j0e1=uzBWg=4=nT4n9--&xEx}3f5Q2ngVTRBs zydx6PR~##rinGN}RlceyRi>&~Ri|oH?NNuR)74AV@2PKS>@@~Wm8LjyzZoNN_EP0TJF^9 zbi|oBCpph_UhlkJ>!A(P)@%1@Ki8hsUem?u(sZS|8M>!*pXyG#5SP9#NiO*=Q(Tt2 zY;if^8tgjPb(?Fe>p|BKT)%QX>*nc}?AGkI$!)vaKDQ%opSykMcERnYd$@bNdzyQ$ zdy#vU`%L#{_tWl|+<*5FJe)kdJ<>d$_t@ic$m3&=lOF%@xUMhNKdaxZe^dXF{)GOV z{+j-lr^a)b=UC5j&l#QzJePYu;Q&=4-)pzGgSVS^w0Dws zruSIy3hx^4Ro>0sPkFa`@AE$7{kiugpJbmLpV2;td_#PTeIM{`^}XWPS3zP`)dz`T zKTUK_`i%tGGOUuLJx=VjyxT9fo$qng?o-4W_IVJlC^j)G&5~#?DHaBi40T_!PPL0{ zRK<|N>cwOR(ldl07bhqE+u9q}^O_*#-D&LdM*PeNZ=hxlJ)iOQ3VQ$0wk z#S>(-Y7ePm->eT-SG+}1#b>bJ#NHE0i6)EWsiqPyRSjuUwcz_ryhCsk+@}#gPnzf! z(j+cHnb~-MMVi#R(8rIse@1>C%CYwlyzNLB>Uyc(z;_<;(&XZM0Pb?!b4j`|kyK#J zBiUQ1V`mL8ub0Rx;wF+Qo+A^)r!cOQxHn>5OeButRT3^9gVwc~%%@Xvs`eprAHJ7r zdXf3!N4P&m*+0lq@gFF^81We-PnbZ0Ssig1@lpp9FR=>u3fw(#t4JO##u)Gx-ANIH z3EG*VqUZ;Eg>0NWpS80Zd%bCBSBtU!3LOMv<##&L4wE7rAkOCakdTl48O&n=>sK|N zq;ptLARd5Qh0xPne%aknzts&~Wvl)`8pDJ2&F}#HsTKf_4CZ&a@f*xcjtAg?;lXm#&GIM)d%XXN`=odr zc@`WnJXqgN<~YNH_090W@P#+W<6e@d83A~L7U;LKK);nfXS5C41G8|x$Y6Y7x#?}- zi_tB+LHmLMcsWDD7#>($U4{HFNS3%8v@;g>4C1Kz689mj%MiGBpSGVT#KF{lQ99M* zDog1Sz9&@lq&JyNR>!CxNB{oHTl|_-2`;u8fvBOUv9O7dNqDir@{m_Gq=KXp$J-jE z54%qV?@fd}ZO&Fovbt{2a#+7^nB+dZ*~w!S*XSCE3=3hD@Sbo=_|D*F@G|%tf((g< zbi-`J_8^xa_n+IZGp&$dE(Wq0W%JEtT~XE-WfQuWm4B0el;4&gmh0N3_RH;;&c1qf z*V&zCx1Vh}yZY>ev!SQoIekd`jrQw1Ac0Q)F0_(}R^po78lG3sI&5xXD>0^cwrYA8 z3@qeniwX^2wNlq8&&XC9VK~+5&^xkKh{(<_7-B38jBFJnsyz*@sd)u~t*M2Pt*QuC zHP9Hipx}F-PYQiduAtrLYN3xYuvOi=pfzJ|A7$H#|^W z?9)onj7`L@V4jrPkz^a;qBA7)iEOotFf3x796|erR!HXKx0QuDXg599o!IRQSQ^-J)1KoHUPO?5hN@4Rhw%U-mywxhwU*2vv-x`_(koFm5%=9{Dmncy{z#%cqp<_t57$`Kn~8p^d20rwMxp=C zRyup1g1%-0hKaEF`k=-n)T>5(Hol{H3pIGxB6TwIM_^nz7Wpev!18Y4dn7V_TZD{N z<2Ot;SXS&HZF}Hst0Q3OjJ-e|VB-q7xkD@017=>>MfSlNL_eHq3BX7L0bL_@vU}p! zf1$9tdqHORhCLC9(e&Z7jE0383r|Bl?9~1^?Uo3;JP9~W24+*?J4yqL)3LLY0qkeO z+8su+G4|nr0=ACQm8XYk^DLOvxI0lQ=5bMgh*3CLc@xuFv{M|2#tbD3NvD`2@)gEFUsDrR8W ztHs_*9mnV#U}i38=n|-S0cdC;Sp+`VM>d1b8$fMK$rW;q>?dE7RpHET{? z<;?2ZnNG8(%&e^Jh^nVoPnuclP&=bD$!^NMbyF&5pps)%?VOn%MO8!Q%&fJWRZ})= z%Jj0?Qyk}3&YV?UJ7dP2>E)F(9W(2y=U3LunuuO1rwdh8VpUZ&?ixl@lu)d?&U}q@ z;6xS+iqha_w%ie16tMgp&o6ONK<+r6C&_nsQeL06K|po>pc-0JHhTuBkf}IqHRmO! zRnBB-N;!%=rdJ5WUh^LExAU?i@wW)3(3x}zT|=LzyI~uCO8-HB$B&LYgfLi#{e^tt z0bz~sr0}A!N7yeM60Ql?#AxUeXW5ruduVYz z^3>??XGHS5=1ogg;e<*M#@T<F6iJs)lc5;ATbH|7xD(wI>TFKuwkP}MY&SEMa<>|X7U4OvKu2X z$va4r{1wXXfGlOtCX7Rm7B|b!k{9I7NI6Jekz2@qK!xSA-z}=;;V5$o^B&IAMqqY& zw7CPA-U*4^3OOqv7L6}=aEV@i2~hcg80GC~_eHe(3~~>l-N(`Hle~?wOrr)qT;u~N z|0ATZ7O=fe#>-bBQC(4fKUy=8Pf(w={UTy|V8;>ACe!>#wdnOxw4z6e9gu!KKqIGt;|qYyC8U0fy5ABXjKUWq8je{N z0&3#{(;blZjM@%>+MJMj4l|FJZvu`3k-CW_%C7@{-e@UazJ}D^NZpRqk3eVa@79>) zKhQ=tRyA+=EXw?Xlx%a&y(seo87TjZa*?RT<|yLpTa+oqDDrq;jG`Fjoj|KUcCT$zbOV>_mdHOmZPgU&9!GM~#M9aj0rA^q;b$ZMd%h^X5W zUtvgRGA$MTjK|1JfCI*dGtpOfsmP>~p4da`CCIR{fH?+>k2x$}MR_;*15o)PVCqdk z`$68$3;a2ZKZg*(Cllp}&*y$Cp#kAM!V5!GT z{2~7#pT&KpYe7f@9^_B&nA=ZXOR^X!=`I0u+$DhKh#BSzZZLmHRzOewRX!wtD4zfq zn}d8Ae1rhGU=`Sim7rkP66^YA{aRp&udlo2vKWH^)+%#Qa4a7|+Jo{n`6S*PGc2Vu z$j2-&l26KKzcIvw@8(J+HzS9o@A;?6Xhky3siFC$@rd%`&x z_dlQ`A(-dEIR@+ZU4oU2Q7EblcPSO1<#8$k?RKZ}?s3q2C!Vdlvrr*#>qq$~`CIu1 zGlw!9?2|*S#}ECU$isn^MoSyugD2(1aw^u0h4Nr7apPGYaBY^i^8JW4qt?TCZbZdMk2`ZsiKf#xwzaj&2p#>VR|!1sr8I_T6f%> z2FN*}(dF_GNaQAYHj_fIF%Xz^hF^_+flB1h+cfydd1f&C9^BtAk80rb&=7G z8<2LEKRfu2#kz)0u7Z8YXN4!HVzyGs-^-`F=o&sq`_#GxGoOFNSM4v9{;cyY-I`N{x0q{n zdy%`mGw<$S%KF-w2Mg0IA(S*ln)BI1PMX(*jO4550kcBzOXdTb!V7F zhM$!Ocze18>)CbIvo2!MxzI+(3Spi9|N6VDByaLHCz5rM% zcZUCK?{~KFze$l7V@@5qJFMlqj`r{SQgqb6&sTCRJZ7OzuJiqgp06qxh7AJ_#Wz+} z#Ztu^n$(@)|HgscoN55-X zeORks^LO|4P0=9l>Douvn0z0v37!4FvqX6-pj5QOv{W;!6W#PR`8m#aJO~P(xOu0-#@YMLgar*MgOi1 zMGuh|btz{=tB0*qWN5=kdxbx_)~I}2m*IIGD{-e4dAE6XulK);bIZJ2bIiZpHE_%M z3yYo1^8U||zspKvy>6mKM%PSIe{Hc_ct6}r%D>Kcmt|dSDOSWBx~DVixr?97tQ~Ux zG25yZJIK<8^6py8I03oLllnjxR0;oL5Rgemc$&^}@-Ya(va`8iF%CwKz>t zk1G==bRNTLq{p$FS&DNxui+fe>o`BufYU)A;@rjBs^m*N#-|ehn>g52^Wml7MF4wi+$N)Mt0^?S)FIH zG{nH{adYs(*{neLn!K@}*&F9Hf^qf3JVS8#;fli^h#R|nP@?OCv9 z{bu~7TQ*2*>8$E&yA`0w=HHHkDJjW`+o!2-%||3$tMxqJ_2W;*gFUG TAmDup&k;BqB_M@ScGmv~Mg2f( diff --git a/www/bootstrap-3.3.1/css/fonts/NewsCycleBold.ttf b/www/bootstrap-3.3.1/css/fonts/NewsCycleBold.ttf deleted file mode 100644 index d5b3c6c05ff72a77abfe514138c2cefdc128b952..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 28724 zcmchA2VfM%_y5f9-dz$>?k>6XdY9w^q>)Y8L_|cz zf)pu=sEC4qq6mlq5fD%jMF9bolI;FJGkceU_$|Nx|Nom~+w9agug!aJ1EGWvJx&rK z1-W_o!YpA8yF+elLARowH{C1drHT%!-&dh<&|IbX-5ck zCM4~Lk!2;r>;Jkqn~==U@jhuJG7M96I+=PjnL;M{G$vsPmFu1C^ ztZJlo$pXCJjq*Ao5X@T`uIWugJdt=qh#@S*5Rxkd%b|3&JW|v9-lkmX3zUmRdsfXx zwVZprXb}_RO|iGaUJJdg*?51ayz$m8LNHfP@ruwv^R?be+^AWj*XxLza#e%TqK(A> z$-A0sXd?)%#V1;5B2J0%2HVeMF~yrK2K6Ttty?FjU%Pg#c3thCNVo_~Zpyiz-TaJh zln1Z_w{j-^m>p70*-gJGq#}8B zL9)BWH=}jwx*M;K^6}cx!pjhm+hg{-o*$Nt453$Z`uWhYk@C6)FFjx58xt8aDJmdn zK)*z}ohiLrR@|^>MvrSfTsU%}^_;-43ZDp5yrn1x zQ^>W~Uc2^M{UY`0*VkYF_4NpCK*il_3~r^$HBF4R1#uwm3~toJi$Tt;6}7C#WWZ3X z(T7D-fG{qQdbkR1)YIsdWR2JBJd=~+P3CZGxYd=K0k#$aUu2BQdMS|YKEeLU4mlF`*w(BQ%PtTTiK9xUeM$*6m^<%P* zz8Vo{&7=Lh{zTmlXC7bqO!465OGkGu@<}h3uZ2IlPri4gl|+9wIh)#cPMmm<;asG6 zg@yy?80-kgHA;%){X((!1>y_L@bEIad+E&9XbCegwxeD;SBYlmQx6(4b=+!I4URUxJjP*X5Xt)*?{ zL$$)RQ#4gRcuGDsX|+v4uLwkV9#}#Q zi6JHd&%1V^ZX6o0l3Of49yQ}{Gx|rqQCTS-)pld~UcgVIaPQ-K$yGaKz}@wDFOW>- zwv?`^2c}t3TpwZvk_8H0p7C*jTXIrZLZ%3miu3X`=yh6)*%~f(k?X%nbZy}s8JIP0 zYTF1OCsC@q>0(aknK*IFkB>ZdsdB^BMb8Sq2!-+!6?^B-86MH2S6WqvxK2YlEnmNM zUUd1_=dhYyyZXHI1sh*?AiPC$l{jI}Vc3ak2O;#+`E7IvJ}=9 zWjlgjrDzm3(s(v5Ho(LLYq-U%)0!-d8o)tJ9&FXYMnX)5!Qn~W6DD8j>E9+bbJDtu zfa|k=zQ4Kc^g*3w6wdh5K{&B!?4WLCF=JNdwJMmKm(hMfPM62OnU=*R+i6HErGe zVRH+Tr$4s!@epVK%JGkUJ$nGwY69lJAFvXL3qTiQpox@0jPYkWnNF^MOqhD(^5q*s zgpgDB$A0nCx{Ocd7wJ$whdkw)coTI)8E)}8sIW6@!EY@bGZ{A#^sbbxa^4G}ojVRK z@7!xt%J^P>ZM8?li26gi=__8F+ok5hlV2_GNG;U^a%G9oW|+m z_xJ8-fC!8S_5sYtXzl|qyhtJ{0?g6W>=Q_pzF98!K{M8 z{(9an7*$-}Wtzu^Hl;83>=hm_pO)z}g#)L~pML7{mh`#XqZ86!PjA&T_Zj)s`W52i zRSRNz#kA=^bB26j$CCK+bpKv4n`X;LUtf?NnYjJ*Tjkk_)lWXRD9k^wZ*|f3XOpLt z?PWAH0Ao$o{0tt^5@Tnila!p)CK`a$X(@;X>^KqQ42d%u^dtn2$-E5h_+(XCL1Lif z{KSajuDt}^taWAEGZz#tq`rUD%X{T-hP)6tyzi_vqk4*S)^|=F?y}+4F5P9P$z8IS zeDci9@8xIZ9r8H2uyf?Lq0c})5>y@_1p#`{9o!lJ;GE$0Z87rJt-6!o2!hIEco{}< ztc=QO;%?t#yoQy$|7H_@6HEGu$23zR5s4$!If8|x3M)p{9T5{p30LZG%n_Cg%jclo zG`d@yC|PwGdH5)nl@BhV%^Y)9&R}BZfyt_8C5Y+KeaBPmVG}>!B$Go^`_7 zX-ys=?qox_#ho*|!~`RFUvj(wN(&=6X8$-l^mBZdUx0Way+m8BB-h6cb<9XeSF+Tx3VgJ&?(?h~hTjh4GsUd{3Juu!7 z5%=J^kPQt?kB<7YtT6TGKPg#~+NOQM7=>J?Kh;i|uqU|ntR8(=PB<=3?V4Wt!Tncr zk}LZc^{Vfqxmr=SR#pmJoV-g$yn3w^OHWBV<+3zYt0R%XQs|1{^h^kOnRL;DH5_~Z z9AEF{8ONkkq8Apy5^N3crVmUTnlbOAKbGZrAJa!h`er^~)xkURLTqL4)F?j(x9_5= zmYtICyf{!u9kOrFTPsqg{4r$~O&ML<-ZQ>nLYHOR<%mHZ{!y9jLQ>;`_AT9Ze<|Zd z0*AwMfP)k9gci%8pbragO)>dkcTaFkoi>DyT7G=|IQi?0j?1spG9k1&wDriYo8%Lp zu3GsA{i>(o-g(VcxnQY$xOQLe)0iKFtp;sEH&FEgrW=HqYQ)m|C3KhENm!$~`l&ql zGuaHXQOk?pp}b?$@(rccvh@swQ8v>CyViIRxNx+CDmesth$Rv5f^w*GB~Ddn5?vXy(3FA-O<~YwjN4A%VholNI)La)Lu3xV|t+`si zLKuC|B)n4(bVK=4oO+-<(_v7y^g2UE*@PL+SlGFY78s5S^jscY3!@Zb#3_cjYIs_Vq)A4fSu;4Hv%py#B7Oo_G%Rz!%wAv2xdi zYK-?jQyI`M7_z1_-a`YXY}Pa$0vnPV0*?;)h2~O=6K->_I?6xnmVc0h`?BWh{huYT zdnR@-fov(4_Y2Sl)|@if@rJ~e*Y?)0y+#v+j^YNCUVMKtiXaJ`X5ItMxRVGxgGY&A zTEPZABN&l_ikhf$ArSI3*}=gSoNVqgiRPV+om85a94yOD##Wg_(`LVYZ{>!yPsw$E zty?HA8#!jwLH9PAA1r7BbpZ(P6t@3Bmz(aD|1$Duis~d(q zdSm|3`f+SN@{f`_AGTZn*Yg4U35433MokuTw1oW+e*boU6W$dhtJOaC+a??vCRAoF$gtDi3kO^@xpeekSNWv@=?UX$pp%RAA=xpr7WlrMOqTY7YE+e!1vE0#tY z{9`lo@-k!nF@7eGLOFhL{g2UvAce>yu4~Mneu^oZQKkm`s~BYfJ$K+e=AiOLF<#Kced>%8NcOSR7DZ^$ox zci!pJ_nND9I`J+$K!+jszhmpe`st3Az}G`8juijEQR1o8?N4kjkN-vAkbB&w(KPfA zd8puBe?_<{+^zpr@Tm8))h$6?2Q&n@@S4JF*W?a$Xd%8%_yBnDff!xCU&!Edf^3xf zqdb!di4?5eL_aKt6+Fjdw0J_8bM6}_dwt?QjkP<@#57~U< z20bsISgEaAi86Uok&vv}$oL}m%Q~wr@6O#J&psz@xpQ~Wv(KsR6k*)nWEbc27<7?% z7+YA>T_fcSy}3OKb*XO6L|V{SGoeP_(udU(NWOAaoFGLLy=oN!=C`BjKPJ&=c%r&P zO@Ja6mcZl!*AsMBraeG)1P5Yz9Q9A_)7liK_Xuz>8ZYE!&^dwbeb#^6A*@}&T-wI5 zh2C3l9on;vhi{7|ky)9RURy>C4$Lw+Qhi#Ylasrn-b<%9{FRWNBri91@*K1%cl+as z#Tf;`{%%IeDInB4*t^fbj7XOt_cks2Z>m4-U+&Jw-VXb(y;v(FVN%(wGcaxy2OC%t z_BCKt+Sb_O0KwTN3`EWCU>39BG^v#O271LU=oRPY>)SFYPCoD8aLK>cSiN@Mz`O_- zQ(*fxmD`>YXN-^?s3p)~4NH$MI=8gDcSPM+MOj6fLG{=CGAyZmholcb_Vl8J@fZsw zX&B2WsSTH>dMK^n4Jx|;c=+Z;RjASyRni4xLtS?{q(!9tJbhA+_(+eJy*gFAEN2T2 zGDqpT zkuJ;csBz3L`FY+;bmr8o3_k(pShdeFn3E&dR71E`07#+Q8M*E#hHyp#h$pl8K>?zE zwAwFWP;yUG#37%A9;u}ZXARlrQ2+YqQ;)Qc3px-!SrnpIbFOcC6Klxj|@VN)@(&H09~NO**B~+ zoXJOH=c{gd8T68pGg(LBIxRzS4=n^GUqvPrY(kT>Peu`1;oS4<;~l+YR{6W81{Vas z89Q9|_+tLjed#^cB=nnbU|Px)pFYD}vs|T;5GU%XHMEucj2}@p*Xrcq5hcH7H2Ow` z2Sf~PnH!nl8k#$Dz;SUP z8Y@s<>H|DsgG_QcA5c_S@D88>K7LuKid*Luc3P2B@FasyK_3Pk z2BnT6b=P17Q2P*PpbvD(WKKhaCLmRur#Qm~QbfKEC7=O_vs<7ck zN_Z21CA5p3r%dSLLhan7bG5OymO3@ElcS82$d52iA_r^U<-7#_tV2I;%=SQI4P2G7 z^DuW<11tvBN@jo&B0f$yL|r;h9Gj98lQ?}+ss3QCaeSAx!{5)Uu6v3)(L2;QqJ7sR zy9ZT>QAPI(=mo!wtf_S7OY?rVud%QYeZeCGyfHCx1{KZ(y4M-T)=IA4g>M**Z+8pz zmV%ztm_p0M9pbRayn2S#q&@g-3hKr-*d;m!I!!W;K53QN?w;Q!)m)CK+XK0y90pk)e|_kaGQ{2?v9eDDh`d37g3J09!crc_ZL0 zY~MB2#a34zw=B9~RY6dYN9vs6!{?-W=+lpVF+MRjAl|Q7$a|kotBK3<8aOlg&ZbW0 z!t|KOyG`Ei?!Nut<1y)BPi<-+JY?*)o{@1i(=d)KWde=W`q}wm_VuOO*Y5UH=aYjm zuE7|g_rk!>R0_763P}VX0Iz}C#|0zb4p|aydo2?*K4H!H62JJE#4&RHml=Bd5QBp9 zSJSawy}jM6CF6xWj4`2gxBc_uMs9ivO4O2rY=o1$Es0JqGxw*ki|4d+hW*QL&M0Qcbt@CUky%QafyaTMxl_0X6IM+*oi z#%tj~#r&<%9honUu@3G)1(nm12y1(JpObg2x#J_XnWerdEi`XN8@yX)I6AF!h?)?e zUOT^I2TzmO5Iofk+` z*L8Dm@u=1*C_Jxa>7x28`p|_7W8w!?Z8wjmU5%}R zBV2;#ThDfydUghNt(+K>?kw#RGs6oK!?T8tJu9wz{v*jCe@ zq>`=}0yg(Hz7F4ls%bOFm|YP3qcAXe&<4o>kGq5lqRBxE&i`^{TuJ8#WQ5h)C?zbD z?NS1pSSBx8g;I^q80Md#&q<~`^#+?rc?vMhAs2hxCGLT7d zPM~l*3vhM8aSoNl2z3SfFy>v-3V+0{?hs#^)OK8TqCwl=Iog!r6H}EFqNDXMcb&iM z(60Giy6}tNi0#L>k6)PgKt05wd*5qs~0-| z1S`!>Y(B#!4|+&*9XJ|}HI7S8EJA7_=UG#(#>VCi&UCiX^d%|9N5O&Bdm4rUcQ-58W+8jt5bMePoKO& zH>|!6=y$AmLL93N2OnWl3ar9Qr=G{si1PRMjw)0yQXOqoxp&_v+Dg50S}&qKrC_l; z-`6u6vY|*kwo`cSZCRil7!8yOYb320!}vDy>y?S?g*7WUPD>4Iqa!8~M%tiw90W&e zY65PfXWwBaJq5rrnDfw-Z5=VS9-s}(+Ibh=847vY5tcK{G9qct#{)WmUy)%pT z$BrCX^^Xeydo%FrfTn|e%%wt!v_l=UK&r$&!dA^4tPxPq&PVK#A5_~UvZHxO2lIQH z$p>PkCKfR_Cy6NMA`Ze8eQe}#93lnLCp9;@Z7TsDY^HF-cg-V87=Mg64GnEM$3MK2 zxnu8nUESUNdld@bNfX6ij7LyLfj*zNS0;JVHJabp9>E>#jR6x< znqhx3lr9ctc&S;~if(+HQ3-`sqhC~~_LZrz@i7CU%vo7MAz{6vG_U0qcFlHh%pKIF zyEUz2KwM@dOlZ9QaZ-WM8n}veg|m(dt>m?RX@O><{8b;?1MALoa+_`jn~i->PfQ;v|GC;2+TaV+gE?fSz@KaaGQ!nJL9ndYU~ntE0Q+ zFVxzO=tG2w>UpeuniH&gk?Q1H zMzC_NdId;Hs&ZWFsx_h&7vP#dhK)_BEna|W8GPK#hzAxBPlea_$e+-(DHA44sXO&j z-!bxrX~kZ`uj}ePs5=doXOz(I<>294w`#<;^>Zdn5cK}{s3 zwH+o6Z6kz)+7KNan4>!LkqQXVNNwI#j}WVW&Koi92FAO1Pg(l)ta%0PtiWKEx4>Ec>7vQtodzP503Hu|^Wv`D1T+aQiO#%I8wV+&*9 zwjAM+TlA@de$2rgmfoQw9Nam~!5zgM+?qdc-MaVJKfAcWkFYn9Mmn?vKRQJ6gfyd; z+2xw$AEwiU)aLoR(fn#QOA#~I%iTn`aA))#x-qV0Hs`X@a8zptu@Jf5?r!(|m~&e5 zsi`HExMFrcjAA3r{oLBNoR2WA++Y#CLPQHwHF;JThRollv8`*E3b8xcTT%lZx_rd?fdO$|=`j@tms5*;PJUwq{Ow^? zVUZ)cViO}j_i5+qE^~f=ZdKxBIcV1|;SIUq3HdYTbr+Uk+>A*q(5X0F!*Lk;2=ZCH z!Fx71KFjBcT}`w6!}JS2&nEfmJZTR;&!+im`;YPVo96TR)AoG+$R|{}M+3yg(wj`~ zhzN)A;z2eD@LUbMVeD%87>!;H$I&r7N*?Snc9ndLKg!2eQ6{26XKj`3(oSsx>=s=2 zCCu5Un%z|cxa#(08y~h!5Ftjf?@6|XJ2D#@bWCO`rV-Ar8ZEt;KXP%`Em_Dpj~Kq-5qZX2 zFR6av9QKJ)Q8GA)e82XpfQ3+G_C z*5Ie6V-_Ri&@ZO{*~Rd1`BI0P>}RU>$(IG)qWBdl6?HlUbeuX;IpgXhrSivYEy+y8 zfmLBY%rrA*L4g{tfyjgA!nrz&USgYbs5ej`{?(R^K3ef(_YtX4Azp5dg7|}9P;_2o z#rgHah72ij3)FkIHfOn~aQocLqvMOaJQEt2-^7w9&YwNAOG1i^p|z!Ra!S$cy7$HE zKWfTSa}3t*kH51fGTOtMW%c(rcxv=%%m2PhbMb|Z4->#TaDSV&r#_qQ1#2EbJ>4?KTyd}r_ZfQJVmL9qx0W&fC+@S$!&5j#R=Hi6xh`4GjP z+#^&I?;}6)MURT@pNuHc)^Ak(LB1^>E9g6@M!s96*O^@0ECZH&+%YtxU=B@a^cng& zEs1Q`&eCh-^r*~WyMs|!)-`41#8g^5V$>^ZqtJhF17r)yXr8ZG$Jc$G za>t&pEWny(qkZTp@>#-q_=w|MF$6^_@At5twT@htuY7~@N3;U)>c9%tx;-DxY(aze z!%4+L);iCJtYPC^3%YmZUr#*5PvPkW7X?@&&hehiQe`4{bK&oS6zgFoVbd&<-bO@6XwU)loy*j(aPg}^0_lZ z@8~_xqkPJ!#7al^j)SK3kbjfMr@i^yBT>cQKEmh2{5|3f%`VLUAiXUmVC3ET{JDQc zg?k-?N)L7Zm=F9e9A1YZ3K(SYhQpoZt8jmt!@Wtqt^KRK{igZqdTiwD!Fpg{h1^5@ z`scXQaf<;9Fo5NSdC-Ezj`iQ)zIhuV?5E_pw{HvQZ{Oy1(v*Gh1&sua8dUEuH)VK0 zuGzfZ*uaGAc~m7c#4)#!RfrAj*QJe{zY|?2e`_6H6yxS2XYFa<^QX`H7RK($DTjmT zP&aXcqa`Dz*XOC&k4UD-f;N4=t}hxr@iF>6wFdScUH#NA%u{4$^XL8o6<)3kUj1zF zvgb2A&EfFEn}+f#ybf`AHOaT(>23}eHJ{t-ZE)A}b_Ssb=ARlN9^v=}{W=V?RdvU} zJgn6*;lj*0JPd(*seoh#+9hSg>dg3M3B%(&g5bk&v3B0_c(EmC;fS3{6{*rsxzz)= z-Rt1%=H_L-pQD>!f5s~yC38gX{1@f#)=mv?Ph_&$T-I~xs1gB0VG4Ew*R z`Xozgna>mB%!Cn{>0C~*RFE(O^Phpoc*c7%&A=8W)~Gp)+BvWG?{~FLx^U`IZotCV}&HmCxB+Q5(EezAjMP^)~Wk=!Dd&s+k-YXF$dAzO~3GA zZOQY<6zF_&VFxOad)C2HgEe~{u`XqrYkDnd@5Y{Ob{6zEiLV{L>yYfbl|`%z4kVb!EF72Xe>u4(-^!y+J#$PGGI`VIR5=+bN?*!l>8cWr?O?_8VHXGP`f2 zI7~jPUN!oaEANSW+wwCTm+kv8vGFfkU;4RVlH5VJ)UaH z+C6CSf|3$}4x3v%Y*s1i+2X#@jynIw=MX;MeC0S|kBn?iUNA`H^G$b*-NwMaW4SE7 zkGQvXkb8;oEari^6`<%gi3o;8A%vN;aWUFs#?(+2;5BSC%na_nz||*^1qq*dwA7yk z3HxO}Kdytfn-iTXPo@Ig^9!RkJP|TDrC|YPe0}3bQ4$ zU)hurNm$tYlo-;kH%g z?bR@*{m|FU%79q)gk)!b-{4TcKpN&A5$Nb46i~lILhFRID8JT4afR_dLPSkXp{Khf zIeY(LFc@17n;q=n*L7?`{kepjjc<$w_f{nt)|}qvp#>u%g1r!G6`Yan=j!ZWbfM;g zDvhI0RL;UqR<|7h2=AjU`tSk$u!fk2(CjL}8^=wnyoV?0q)B^kIR7G#>qqfB7F1?3#wEX)sHfLB}G0)(KjL;4T!TYT@U3w=E zp)O5F%V42NDFX=3W6}?fx-rm7WMh{$qfZS9W|7jA^=i;?@M0%`FFWj$P&=fy6%pUu zf30p0om6g(&MQvY8jwRVFTMhgVnJBf)F=6_)eC+Q9c`E-@0j|iiv!Ss9}sd5ve^~Z zGUmx+IV>*=hs5|FAgcZ%ND?V02f&qv(Mr089;TP6Ea(M)eBqTMOcj<1pNXzwq*yLi ziSxxXQlJzob&v*0RnmNEwb&^{wZ1Gx)JuS|* zxZ|vKPH`UKyv+Gy=Q}Q*F2yd3UEXln>vGoRo@=;ky6YU*Wv(Y&|8#S5>*KcG?Tnu2 zJ@kw9YxOq`(T2{3L55L=w+#mjmkc+I-o_5be#WWBZN~SFCyZCzweF$r1KiiU-}Y$b zk>ru%(bZ#sN4dvZj{_!eQ>ZD{ly2%^>SZc6Rhp)nwwc~H9X6dbT`>J>y5s5VIoWfb z=Q7VVo*O;4d!F~o_v+y_#A}q-WUqN%%e?j8UA+f*mwQ)x&+=aEz0!Mw_ZDy2$H~Xj z$LtgBlj@W2Q|z-;1?qhGLJgkJ~0 zZhiy&D*Yz<&G1{|_lw^hf8xK~|6V|3K(BzQ0owy^@^vJ0$mT4+mxsEg|3O+fU^xjn z@~qPm`&FJ-KgcoE$rWXpPmU+yS9NdAN^^whLt=#-;;HFK7E7O!6;eEL(<~>Yv@3}e zhLR#2MA%8Z#cL#pzK=ZAqkTynzP~a`(@CcIDCsV3CLN^>Bmp1PO_0op%Uw%)h-XQA zX+P@_>$2;_ z9oIx*2F6&9x$P%w#7!h${FSs5UngneMI5h@G@*zH;tk><{s?VqI~hoqDF?*o$qc%m z%+RL6w|N#vEuY6^@pqJe9M989d!d{d#LHx|xPWLh2#6FPK|7D)@WWxkT*^rnt~p`= zi2*!f#UJ1o90J%nlPHW+qE&c5gX9WNzzLvsf^``R=^{WREbX$ zGyQ`Mp)&lT&ysN{H(8oU5;&}T5iR|UOcavIQ1Ly~pG#7ur*V8qGQ>foki(q8{eeRZ zJ&UgcTZ1MC-32=;)&bX_al9h!C5{biz}BJ3A^xP?mwqE{`8u$*upew4W|NuHb~2O0 zoWcEpLo1QCd>ya`Y#r=};HE4T+(j|@nbK+%>q+5C3a1u;h?n|~ljtahW2!S=- zmKe#Zyk6w}dVu$DLtX@GNtmb$nMD-ZhV~Q=3TK3~!5+ar!GXc%;MCyU;5W@iv*~*M z4W>U5lnf>>qGS(SNq3a=N6EI$ODcaT-zy&}%ay8nx&CVXFBjgvu>Hce3!5*jy0Gkm z_58=@_vydUpZXgNY{UKgWj9q8Y?I)H;D28Ol57CxgAiV{fG>Y+_W%%{)O-;<&fj*= zwFcY023FW&+db2Qr`qma;k{do=$0}v1y=iD=)%(g<4Qc|ka4&UhZS%fY$g-=wVI5; zn_$Gl1V6Nn`X&zh&nW1KQHWWJMI=HT>4RF;XupED6^z_yd~e*?Mq{rd(bGgyg&tz? zn}D%YqgEC2CZG;$p%T||$Q^bQ-gd&+y8wXyBCg_VGLl>+zmY{`6d*sEi~;n=f(*yOW?aQrbP`r( zGH~Y?VAOQrP7RrfDDBY3`3TX6Zn{ZhD`I1_bDbwn85ccaQdL=X#kgwMi6g7a z${HRuV=79k$2pH1+nD7zqPk>qS?Rbj!yHRWCr#vcQr@KMagGxzOD2pQQ!;U+%jB}^ z2^HhUj-51SSXs48hpLLHWt9_#qKC3ELV3AZUS5HtQpG0<9-wj%XPyxOY=YqcKMJes z0h}4+DB$%q&XnUD!#M&h3j~(X%94p=fpv_%GJe8Kj4rEYd1^Tp-^RF=K%5*N!~4U$ z>`=PcK}(m@H8`)QN9kGm3pzCm>B1195`V*It?-6$7@X_2a8J}Db}dwl6N|;^_%Usj zUFVBWiL1qR;vGqlf~8EUv-Fg-Ryr!3m449>jg!V-ld9>a>7yxjn5Y@6nW$N;S*_Wq z*{3<9`Bf`u_1b)GH|-GZaP27VMD29#d}z1JwJWvnYwzhKos+JcZkTSj?x?QLLF?e* z;Oh|T(8?jpp@#!na~S0?5%U-dxG|cu)0-=3ttqA1=`0x3#b~QJWih&n{|B1NZ9++Q zI^?`ST8Njuy)2_>${=;;H;dyp$cpM|qd{DPIzQ*vq?s#)c>tL36#)dI%uk zjM7=kXQWs;f+r8qI_ag9&jjo;Y9dclQLq9s?9Kcw<;$vy2?6*d zFw$2LN4pQ>7>=G!^R|zp?JFq%DawD&$NeG7eumuB$YtaH5aka6vcAesfJd_O6ns!8 z5$|#ZHqFZ`^T>9r(A$9TN6KsHYa40^C=-dhV173hclrD-6nEZee=B(YHek(1%AdRj zi^O6*d!nyJ=<7T3qVhQUdkOt5B^#CA_TZD?~kAK5UJ=na|K0$A*h6*mDJJaMS_{|@l;Ffir| z;C~E2&uFH?YDVW4)7G4_yWcVQD9~Fn#?cm1It_AqGg*T9`=k79v=;>&NLKoy&Tpvm7e+IN zuUiIM?E?9}4KkUHVK_=$K#6O3+XXV7)trv}Qsm!2PkRvMbd;COL(ZEh`3`@20#D!L z>386A6rhu=6eH&v?<-At54Dc*Hy9%*LLJ4QXzwGuIf?lsVN7Z-XHn-j-tR`_u<>9= zrF?*LU-F)MBIh%dIg7Pb`OOD_c`ac66=41zAi4)IKLVJ4i5c_;%)bYB%L6>dW0oyB z6r*sbav(;tKZ4pA4`Zvs=#6o<&CpUstk?|9^mE`6zDLKKEYK?Z>lAMSdnM?P8jQjTI*>E)-wfJp2Oge9R%5Qk z(4tDALzO~{DuuM^g`Cyk^A+IfCE)5kq1_at4Kwt#O3d}plHG;Y<;F;q9h0W0NwsM^82KYshV}LDN5nsL{jKej) zXOf6wv5=Kju-<3tm&&u17I|TfdC(MZ`^OVn& zgUT&i&UKc@lJX|Xq8`707tgON?}E~hlw<6Qb1lvXcmaNb97HdT&-Od4n=Li;@-uiu zLjwLbOOQA`fwK|x`4P^WZ8^44BIg2*pE0LX$``-~TT-qlpF-v}B=Epy32XYdq`>#9 z{E6SM%5Crvq{dp{_e8md-RBwbtcHYskAvR+F#$*Zg9I!?0!o{nQJPZmA<6oeb<~8;x`;SyJ{I{fX3|@=b3y?rd z7x)c7L1Sx{6y_%OMyZp^O<)Y;JKGxzsI;xbVAX~y6?m7czJqQ{lqBU4qa<6-N;}mk zz3{VHFra-Ar6-Qy2|2^Cv(nzx`6#@+V8Lv~$V?LiVJhT@A zb?sGgj&Y#BC&;sAsga`4+D#ms@2U8#^lvQ6G5Q*8X@}K3LmAT?@0-HKjtMF*L2fpY1jEi91^G2fzETC8JfU<~N|fPBsnUnxAKvh>ur*{6%HSuLl@-dW zraXp~VyUStQ*+d_9k-k2J$Mf-^r5LaWFMe?$PG0$FNKl(srK2p<|;Rbw#x8#5yQHs zNqG$%zX9gTTIDz8S(N+)nmJL{+4`up)3(Z+v4WeFIXM3YX#WOzd_}nqT^xx^$SW$< zHtS^vq-3LZu@fcPcxo9ovOAWPt9B`+$}i=j@-cY-F|7M>aI`;|)NjOVhC>hKW1tc> zF)fEB&<=XG!$Wyd&9$F7A2Z_px4_grY;AcCtH&^Bi!zqcNYkYBR$f%rAcuXkMU+m^ z$rfT{3zdC%VnMA)%4}$(>fL<){Djg4IJO^Urzq?3+o-&vOjJvtw2ihJ}?uSLz%Z#egK>P zPYkbs7mYd&D3|qu{vmmJ3g+iH)*g;s&~(C;h1gyE7YTdYhbJ#P{-}B{tVTpxjN@x) z5s(jd4fx@e|NC4Oeykq2$ZgQYPGDjurm3h&c>+4%YxXCUve6ZCxz?m?Q_eE{gl^a% zZMn909lCHW^tVO|<{B%o<2zu@2Gpo(Z1q36gH54XV*O)Bun%XuHqL0}eMqj;%?c7# zYqjTLw`og_IvUG>Wu#ex4Tl@3kT{W9oW6uA^-NW!g z-LW>^w>~%$Rfa3m{+7>Wls&gm&tN&~zS{n->GffF&TDWEWtXgtHJWSLjeLyP*=8@t zD5Gg=(5)M>n(wJqy+L^zyUj@$`gbM&|Ga+~*Z+G@klE+#FtNY2%MJAzc5ho^@~<)dO~PVT0nsm% z4TgYR|0nl$*{ZzG zYBwD{9$O&iOXUb;&DUz%u$U7?!to)Fm3C{S@`0V!Vf|&TTvkpqO-QZt@H5-rfnN6G zJpbV(Snk92y>{@9hw?mwgcD8uH(^-!)!2?ccU>xHH&a?dAFcG&EI9YsxFwiXp#YSD?K7 zFsxIxICfTM;P?Vs?=I-ZP3&-uz5n0cHS9_LP}@;DHnxX-{_f^_rmf5Yb@yhc-sTd> zR_5wIty5$B58kP^$p>@)vuEWI!0DJWv{`9aveOo7 zK`;BCq{bE+YqNbkv_8J)#hmwmzd}p5TM%#u31?3>>-?F9=eHjwpC2|SHkXFI#Bs=l z-CT0ocpBc>aFMmF?vt9>>OXo=hBWlwpmC@?C<->#C0shHYM3@bM z&wLnu`S4y=B4T1JqPRN1i#Y>+%Q<8f{GHFj`&Wv{taspLeHSrga}hIk6u$N2_&vpA zVxC4!%(r9(Mj;|XCKF>yw9UsKcX7B6z`>&ALg8i4g;$iN2!2k-ITn6a3x85itQ{7U z$08V6gpfTZkKM7TJU3fhUSm|A7T)Zjh8BD=TekD_Lrh*vcrIP>i@|d=eu4PKBSs(% zu!tx22s|ALw$%=|U7KE7;~@-@d;gRoZ7&i4fySRb7L3J%v5~W%28Ub2kJ-vhwx18y ztQB7^wqoq(hdKD!eryKp$L7Fhp#BJ-OFZTgkJz6;9IoigugNgOFzyr{d6>j=xi-=8 z-pX5K(eNVTnpz>>z6!4VE(GJl|EU5@^8_5(ImXS0m7{bEr&79|k> z)i4@1YHvgovBbmMe()oYt%>;t${=WZUzv=0&u6p(A-Sv88 zoH6DAP?)c>th|ER*vE|By%$$Kl~p4~F*h^f`zd@kRgN0n|C3k$ydB?P$M<<7M&;%| za^23ejMa9=_xeejAVeTySA3%Rwao={+EeobPZ+!kc#&|czM%GT7GGX%1w}0NmSWP|d7f!(dN}=de-Vz;@}QQZ)1(EhD>X+h z4W6caiKn-=eZg1L(-xK;a>)jRq$pM!=O)Rd9T7HpB$<_#X4@UCI6l|z;KlY}(2hQN zKn}`1gZUn}OB+bb;1$z@=RUimcWJ1&XBpqD1TGy~Rnb3GSqh}ta=A&0#4t<^nVGCp zWJPb#N;(;x2j9pS{i0*)R}RR29K5v4^eibmYg(4(Nb7f!O&p@HAZGg$`buJ{Y+Gow zKDCouaT)9;lfhxN#3@Fn)8$D{(J5N5!dZe6uhD2-TBBc1^vdzZc%NUdn9Qc(;ZEF~ z%4~Mq@Nk0LKEljL*tywmwrjjj*{ET;!P20kxHvcWh8r;5Y&#Qkj(rlU-k=@#fw99| zOb4Ci=SQ!AIQTeLKJS)b8V}cJK#!4e;(QTg|io`poS=ZaM!CWpnwW+98Wa4VzGZdB=9Xw=6uh zU&HE4OJA9KnM|DMI#AK z@kUht2=R(3h^TH5PgJWXBtM=ovrZwCju{oESgdiG;<3^W>cweu6a}@Islyw{kg6Zt zwENzT_pRNvdApRy4gAghr`7x)zf%jJZRRhFUi+d~Q+uz95&bfY)hH{O*Y?V7k}go_ zDCj9=20aeR^x&plYwz25?{3kp`X9CT-V^+_?|$TOo_^yjT3q^)0tkRk)@5<{GLR0*)RJd zyCOfRE0g)kY^_Uen0X{sJwBe#P`8Zd6{$yN^0i_%)7TeEmhu8Ps!Pbp6vd#?n9Q+J^lh>+K`S!K4ca1uRH?QIQ&~K^w3%`|J zWO`;ltYHQyP?k$;1%%VRQ1hTo5g%_&oLI0Zsh|0xce48PoM}9N9G8V4f5SiAx)qnnQn4R^eS9cR3)^ot$RolA57@k&FN#Q5qZVmv z-{Ri=`WFWW%otE!KA>L(ED>ien2?W%ubf9Erf6hYaNXN&ZSx?Eku7xOv%Et00A+n)RVg7)_5dhyM_KlHwOO8RaCUv_Zoy`vgd_ZcyJ z?>h(As^7h(o`K`V*?7=32^eIu0in)G%&F5c*^_40cFB^x9r>6`Fr|XRN zAz|ZHDho#hSTQlIA1Jt@w1KX`SH8I8-bl0hXZ7FnPLI9u zd_7;Nj=y))ldo*PtG@Zxn!0b6zW1#%e%-+oz30%Tw?7MX+nJlkv$%1?11oO6vuDMu z%8@S!A0!*po1r<0^>DC0p%jP4AW3mLnaLX2>EarPW@y-8)j1rpPAgwopLWR-C<{v( zb)rbNIKKF?W&!A1WyXgOw-!rBA|I-&jQSp3)goS{MtIdm`ID9`{^f>4^`))1gMQ0F zzhv-4BI_MWwaN)Dy~`^rost-c#hBLZ#u~b{TGNoQ_PgpRG9#bTpZ#|kmS6=kjGhe9ch+R3srX4&#xk%c# zO&#PFlxYA~xmZ;X>&(hRfkbRhBY?h~ikKhAm_Zv3pn_o<(+b+KJ#ed%Y zLj8$@CjHVs}{anr$Rf*-M_ z*`TMErG{)=qhS&hqbv=D)5OFYw#xyefI}O)IZu|xw|pVL(b}v@-nRVGIcPBWBuW;| zK8Ew0E?T!iTGfxxLh}v{%;46P$vH9Q@^^?E1@ccD*d^7*?2kvir z==u9s@ZO8=x&7e{^EYZnh{}(g0;=Gq+n%T7K`L^#bar8l5SX7 zx|Z!6Slf;Z%fV}4J19tJfLx1$p3s&aM|2X9Tj7~xDCw=!=9N`V{qEm!rlKQrp8reR zTlZhMLv?L<=-$m^x7Ai}mMdDCTpJQ0q`^_w|Lv{6aQ!y*Bi`fKo_ik~yrg3K!Kngs zvK-1}@}!`{Z4e8Dl3t5*MA%}xVnkxfPKc-AypFcSjzH&ER^|4E9c_#Jhm|XZiIK<_ zF2`7U=!P_KlG&^=7+lUc+lX+SjSOSExuQ|7m`4#yMTfX*DBbfhNbkN^?WOcjF-%3& zmj3`-{vr6)9Wp3P!xgYA?5>E>grkto3pkim$!aN;Pq+LaTYlh86ZwVv)%EHzL6iCX zw2~ly0j|}tt|7NhQgG3rS2R^&1Wr|9E9bDpH$XUrvb_?X36som%$Ik!jF)%Ib*opa zH?3a%Ul?gP%&ShXm9JvtjXwgZC}X6;IAY^GR2`} zKXjSS>13TON@f>C*0#3J(Bop^H4%t^P6nRBCG zJs%5dCAOfgLVHYe2%dQXs+IJyo`^JYo6RIrpjmJa9ohvY+?oxqtlp)Q{@@>dg1~I?m4X z5l1io^ujrZW#H(go23u$`F82Fk=IXrBl3D%f=BJ@Ie32GVQ$;}jQYf9>N)k;nB_Hm z1E0zjzU9JU^=WmF%8R+ibqFhmKaEXu0-R*Q%B4t_I6c=0&XN_KVzXMLLE$)!#R7MW zDR8%fQHSL!TZsr7dR4^zJjgi|iWZO7A89>uXrI)7gH)!okJ_Ao-5xtT%Xh$GR5q^V!_=QIs!}tLKeRJ) z>Jra8@bu9?XpZbZvGj=qW3l?tiyzBnvsWy#HW zi|mbeut8ym5~l^doLBH8YYoOu!jm{$^^qrd z=?7o#8`z`?s?VuktDmW7itaDwtN8TKdCjq!O~Zwxfnu6kPz?UM@M$fI0jV~JQ)3<+ z*2s!wa9FHTyYqJ?F$3O14#~%4oCNGaANo+|s~gmt`6)h{-+2gQ{q^T_ya&&hzE-!W zjhZ9s3iWZG!qYC#g42mPV_f+cj2kC>7Om096{hFN$7l_M!Z2Twq!|>JWDW`ER}qN0 zdsloGfdpa_I^cT3APM;=hKwzPiPVI%{~4<#a2;If{}#<*V%BwYWP z4iU`Q?o48Ku@U&(=JxK#o_225d+|T2; zZd9L<)Yjtk48E36{tLhU@R%(%>htQC>IdqZ0see+?wVAhaxj!&fEL#)iiT;-CcQi; ztk-LdS{Xhnr9lulbdW;QLSpi8N`rtwO=@$C+T1Kl%~GVb3bFPk={8WHtzKQsr(py$ zOAeXi^m>ccATz8TON+9Nuopst^((F4Y-?_o9yr^2NP1~i>kB|O zTY9f`c?Vw5z_YW!L@MyI;j07P7?Z`!TV4;Li2d%f&4QIK{bhUfSuGG{PViB@9=SyL zuSli2+}voFwea~Z47s<`pvV`3ecJ70RH6HMz~dGUJ}?a86AnI?t5lobvV${zPS4*_ zn=N|Pq_J&(w`IKM$mPKbqE31L?vs~(h^?c@f!J90klO$g#;sPUSi2)m)>-v3*R`+V ze~lZ64UAzkq#~?i>GLh0>1{hs$;o=jB0a3U_Q9c+(-^RK5>GFcD}_#gKGK~0tvGj3 z*r3SPL1FnSGhgurI8=c!MFMt=b2TT`9qNlh9r1czhB$WO<+-ij|Ld2ZfB07`;@wBo z+rYik_!Pccou%$l&#Q0neBKo?Z=U)_R6i+#zYJKRo}ok|=ngtFr^~1e4jYYHoz5{h ztdj-hJIZfVQ$!_JChxBcxk4>&yv*!e&M1gkU3JE`9k*;L<^Nh)fWSg6_Ae z^7)&5+|TM4MgNmBU#aW*t6TVB>Hnn9Inc+1%;3OKx|wsyWU%Yvj7A-@_a3jo4AC4M zHk*+(b7SS?IFaQDcA!;<;92l0(TwP&xNREXpWaS3Xh6P^V+8e2eEnHtk)oZdOV7x{_Q)pWnJC7)0+47-LUEPr_{Iq zbhO~`lPkCOTE6<{nMpuD zc9tHp+qhAOM2f?%mlZQQiit}!m(@;Umyi@vhlqTj7c~j$AJt#*??Uq{&p-2u=19x% zOX}y`*COw4sW|%LOULA6z!!fCG#c^^iJ>?c%s6=ZiYyC6u}wi*2mV12>lWmQ|B4jT z(bn(xw*GjCSM^To+&h}fY8n3M_T7)5H~6T!q3A6^WRnt%Nr`TYMPrD!8)a@FHVKNo z4`3{`8R=Op1hfx&cZ%L)gE)hlm-eb3x_fd@5B2lC>cT@`_3$JWaP1-P?BRD7e0fNI zr{Bx2yLYq%F|7qBw;z2k$7^Ejht&=C>VIOQdD3i=-Cmc~(C+77?Gm#WJt6t!K^@R4)`b&N>TakYG z1pUa&c@*UPRc6x(+8vhyO|75C5}SA;sGi_0?IX*KBd@79FkL3(;MXI2F)}j1{vd|D zfT4?yXfCY(kMOHlo|LHsG^e4S<3k4Q?CCWK{3JwuS2@!O>SF2g_`ym1ldbAH^`Mj~ zZ*Q3@eckGXH_@WLByVpU2+Zw=MI6iVbP#Jn3xi?NbfUadeQ6ove6{kS?9lqL3eF=; zi8E@KAV^JY&o%P^IJF=MEg?H@>vyorYrZ+%ln;BJDs`71E`VJ@&QX3tsS}*fDnsdM z`nZ&ogan6PhBqa}rBsHcIBd4KtrcNt!NiKN#sdWlWf08_{C0xM-yW~o(u*iF8p|}g z?dcHk0ugt*JaV;PU;XHvk3J(gkI%ew_3witPfvL9S=I93fu@(Ay7i%(2JL;254CB_ z8W+|q?v}s*RI96@dD|qN?$)_=eLU_AMo$J5!LIl&#+?gls#)-`0A@O7v6sVkAfTKg2HQ+ zam>RI)mUMD4060zYX)XE<^X0QS>GY4oYzAWi)zHqVMf4b7wIenxYE>%NYNSoJz{50 zuxM$%dhpR*tM9$d#nZWoJ9)P>?|M(NI_A|6N;VgRJ{VOg0(~5yPydiVS?gsMi(PB? z`5kU6(BdX+YlA!no9wIz%U6*Q*5?}X5YwdxkYS5v@4dmyOwcDlYe{);v6|ZrbN_n& zpWnTIVZK?XG_6#3Hg9{ddDDa2H$ToZxE24p?H)0VpZw3a^PhP$@b#H5&i(QI7?uvu z#)+J5Nhmem=#7(QXx&ap-na^+yO~yt#RH)%*AS{>%Of! z9v7>YjJV9AO~vjA@-8lu$thuHUL(6bMu>tD22!V~2s?FFSx5urv7`F}f_gv+k`5Ir zqJ}_05pu{PEEVP&7IUZib<>M4@(I^BWY?FCuj5|%OiQtRW=NmD{Jy~Q)J1FHd&(?R zbt!qEOjlOK`mx(W*JUU4N;jqU)#N$3QzLav>y(J zRqyHARjLekwRS1340o}4x>trhNiiO4ms;eNkrXQ~&ZbZ=X4Qoph<`xb-JVp<6rviW zT@A5~AQDN@o$Yonc{He&VRjRUf1GK z`RJQJczH~@YTvT%?X$OSJu~~Rx~22}^;5%L%E0OIf!URhoYMCios+#~!;$B9ZJN9( z(OFf{r><*Y?=6R3a9w8Maf@yam)|1ynS1-UKi`FQiogbyfzLe*k)6e)hr0F{Jl=SV z!QoIU!VVkqu?DOWwzu2oN`_pl5iF=Z%D`BssKko|liM!uymRUAA8u;W8}km&J9}1o zX~o?q-fw*Y(w#NB*NCytz13PEJmcM9l&P8vSS>5;wOwR>Ik(x(x`AP{WaWZ0-lSME zmOh2kg!&K~B3d9arm5*rudZEs_wLfQmokuN6&Dot>Qz*PzS}mcF6!HaOnbMG#~BxA z*6R}zJ+^^iPsm_p;68XQq&X6=8N}Hkz_fK7E&Ilj@&UsKT^&(%C9HIfzFuj$Y*SC@ zZfGAoO4DS})W!Pv}ccA%IiCc&sTF=*Gk%3)Tvrm%bB9N(e>nGFt*Gv zO{gh2DU2v7jK1JaK|~J1p$%cGeGO6)U=^W&+irJY`2z+=K<=F0$>VlA5)^X+G;L~v z&1psCB=`V~5ZiWw5I|JhJ?$vxcVLLCoZ$^(qs&K8aECU1*6k18*EDPXLmQh`Ch2pZ zoWc1Becti;$DfhTE?ai+nbwEI=O5l{J*^DfQdM_+%;e|(C^#m@t-#mC@zryhTw#vK`^L8F#nBE}S)gv^$c znc=4;CKx@?V>a1#jq>jp#bQTADiGNH^U=)D;U_6w7^R zrQuCmH4i

A`J_-o5zU`=2c^#4l@#GtZrW@SXH8U;X0TxewPO2@r>9vwQQF|GduM zn_TgDl#k?0;Az7?h0AO(7>yEgAXYOox=Ay{yd6hz$2t$*ZiIxk6U3AD4C?JI>$&{d zrqxb;-+jtB({}3zkF*|A2EKOlJdA?KRi2AcIztb1ibk#)=atB{BJ8ngWy2Nz$&D)5 zYhzb<4Oe5=%vcpo%oavNS9$JV-u%;@BM#RrT{rWQZH=XWI(guUlE+ruen-yadtN}% z%(kZT?OnQ$8XX#YUGeB!hOBsS;L5VW{kmP(tDy2;;F#L>t+ZED0sSv>6D}8OMjWyd z?=?DY&dRVQWV7n9P`cPcCBD%iiWS;KtPgwzcv-?w7X{rS%jxn+j&9ZQNz=Qk&+ph# zQO~bapC8{~)-5*M`3PxURr%l5#@28)8A{+zoylZ$8r>d~*=*Ch zP`v`F_QVNGAbdRG|6h$>$kLK`N7=wYyVq>zLm|`;H?5901P{-9<%}}0wHOBIJt=hg z*yfRAPQER@Ax0LloP?3%5M>y-(S%JkZYAeD*dG5P%ZBhYSmDUM{^7cy6Ei zwzRC|?Wb;RU5xy}B(-Wt@!^%PhR$20kAW1h%ETP?G{>}%U8m8)?-C_0Tp#CF zFj;|;z$h9H$0A`7R|WVnb=kAr&wYPTm+_4!)Hl>uPe^%^R~^Uqw0_-sj-OD=(7yzE z*P?&7$a-L!vd60+Q3SW#oTP_UFU`N=HHd(_!`#3#QA1l)Bpv*2gi~)G_2oe|tKtu< zh7K+&dvZ`;5O~A;HwJ%}es|gT%!Bsjrc)1z86jqtZ^elJ9Wz&kHCC>#3=3=5F(4qL zcO_<)Z*BRjG^X{O^i}IY>4w?zn8wDI*r2LOpL>VT6HcNmRe3uab79U ziYD}-o1*qE9h>8B_;SJzD!>+@9qx%+>qhkB_PF^+4YNqVZ+IRVaX6VYwQ0c%BW_1$!`y<+wxh|CA(VJytZQ;Htdbv|_f<|&0%@Y18aXJNc z3GLONV2rCyQ9GAVX{&Gt(nUq92uwvVLxHLM+VsuKUpvj$tsHVsUf%Ls_w9c8@%8t7 zSEzmEO&_;k;w{(h+avqE>w@om`0i^ZzzRiYN}1*?R()V7Bi?B+n-e{DDbC~6q@`&sO0GS39JAt94=9A5Rw{KXu zh&QQq{RYcPmoLBZ^2?uU&ekj+_PcfJhl@X%ysF#w^|?P@Sj_tzgl?7CLatT3$}V`= znaDwzJFzruly=EVb-UAb$i$$6ob+FGbZ5_^%pxz=!dv9kp%z8w)ny9ppvx@EC~Egg zK(AwiSB_sfZRz5vt8ZK}c<{1utEVnrF?r><<%1h{%$v7!*PMAfq<8MTdEL0>g9a@h zw`TV3%WlHWN}R8{`FFE+Jv@8PZj`vg;(>l*|HZ?`gt|K{y0|!-3Ds5x+2pdgb>4WR z#iFxnQEA1TZmToZDOsIXr-{3@CQ-8^^d)Mz5&ThQwun_peTu2XR$J&%K}Y<9r+{pe z_=h~;K)!IlTFh4!xQk&j7$Ln7Hz534Y_w%es>@gwd6|zg3tvLf(N@Yc%PF`)2k#mpm zYkmGsMx!IagROm8lFg1(O!eIxUWE9N>|ZgXU|S*Vlo^4iA3(7n(chkqA{5GXO0M{E z>u#L6{jrAoCQr+rvwZ1lwQAPciL-8!{WTLNO`SSjt7I+@*7useK<#s4@}WFM5&64n z)*v^_Cy_%ov#gL))DvTIB_sXs~ zW=v{9$y(j=itKIuo-bd++S=NymL)Bs5~!#vJf#P9Gr(0hgo2q~h8SHjfV0d7lf$bm z>SeN_wZ&<1=$%$aszZX_cS;VY!}&isOf0}voh9ZSRUQ=l1p;_QLFWv}wAG216#frp zlisnqyJKjPID*J5zMVtJf&5i%*_c7MoXhSo!sb)wC9$|DQGOMJcK zJ3`QDQLz`y*wN}NKD>14k?Kt~OApU&7+E!UcJ-*a%I2j<4lk?OP;+Qm^_xYU@RL{L2WxyZ7b{Kn$u~rcU=1GI4^|06RBFCk3g25~(lt%)=mg?m`(g0WVD|o|S zQ1t71XlzdVrS+|Qz71FVt4e!LEbqT;>)o5foA>i$(%@-dj+rpDu&g{Izjo%*Syd0L zc?@IvrD7U0fb46U6_uy5BgLrgobI^6d8<f~|GB&Xzb>J$B`W<9bBq=xWn(hcpL z0Zck7bI4-Pz<<|1OLMEsBFFY_ows@6J6|=-ziCp{fc~?3m6xs?ziNl_Rn<-2+}%qy z^jcW9d*jU`%KDaN2kLSP=fl(OxaVTPj+e3oI{E6Ji+Di3Nyt9#7!z1nSmXr}VR zb&-DVekXfkb|N2Ah8V!Z3POn*qfu{TctuO^!nT0h>Pj+8BC{ZpmSn;@?02>Ex{WqU zVJZ=O!O@82L--i=$%mU(B^qb`bxW<$*wn-qsh6I8m%_%!$JOjoPie*Iv(*-*9$vbY zWnzy}gFsRfC)@0(f|0En)Tl*Y^orI@#$-zfQ@~DY&Q=)oEA?~Un|oc&2e19izN=rNWGg_dgPRj}&T>v~0BNs!*@ zUtZon_D(`NvY&^*g%064*e!8T5u%RVV#iLhjpe?c-%$(GQpch(GSWpsorfRVwk4R8 zQ!--Yh+AuKD>|fJm@vaIL*Jz^yTE>MZYJ;?Dh=kJX~YgPb{QqSQDZbgzsf!>OA&Ej zF}Ws)*V{dl*!u(38Y<; zkLs=`U-pSf2;8L=>vSjRNB`4#(JKuUFe-q zlzxX6lw8-pNQ7L$JMXKRF=SY;$+I(htgJuYTroXdom)HahE$%tvK+5_hA>O~X>7W= z(5;P($n#Y7uz13Pe<6|+X{NT^t;My#n7yLH1u-4JHju`h4pHjT!uaT%Oi z6am>#E@DKbhs|g+axIDqxaDdQKs3V4#-0-jN#N{@>M#*=AhnHsbfl0(z(I%DIMX(^ zI$G5)BGPgBZ0iXrx%CUF>~al1c{>%n#>yJ`AEm>BixxqnqH+{CXMof?wm_1YxK7oT zM0b=+gRAu zIA9>CXM%pXK9p~Fqo~i!m=o!z_yjN_>RatrU8(LV-8tO_9W=5|rx*;j!C`}}xUZ=` z6`P;n<&I%+jEti643tCA>-RzLh#DPGH0aX|q@vV?+qd(Bd?f$f;np)>;Vqx#C#8we zvQ%mH7U=V{TV!0@hrlB`%JXddZ}uUmA8j$6y@wWpr*mS|$D2XirkIqi z(9Q`VgANHq12>uVETLV;lRhBVIi?-=)vLSs_<9s~?U};ItGg!i3Ch+<__}KnzfpZ; z60hg=Q`8+Ic3RZ-0_x*_f>b179}1G;N%f{Ec$wIU)RM!h(F@1Llj2V>`v--s4!uT^ zZDvJA;ha_!eNoBW%a8@yp6n2+QUSPF(r6|@R1`)t46-egd+04XFVDcPe6+IgoBO8R zamzvARrdCd33tpmb?CO%`ni#R{nC;-McOfAZ+ns9q zZy8!GiVf9E+vTSQq1+HFLv>uVGT4q3lEW&9?$~^eX{=wjXkh1}Et39Mi&Jb-w1w~5 z7Gmw9qfBR8Y3(GQ8C^SIfPSj}h>h>qW>?h0<1IPi<3Jtxl&b}j3s4~W*|Fy4^E`ojS}yHH ziR7!V%eF5rs>rprv2(3|->~QYH9(8%Q656QKo4P=vbt)L1I%kOv1EH!Ohn*ZxViM9f#*lvwz$5$a!6>^V)fgmkN^DUXUY#N=T;2x`??kfZ`?6u*OTSj zGjop&xw)cxVNL0bg5tV@s?irN4^<8x{KF2=oT`Gfeyqy?Ois)CqY@O>D#IRI`(NL0 zKrK7&cmH4aPkli5@mhS;+R^ixPpq>Ypw#qsf}J>raltA?|roA;4>4KK9*JRV-uk zUt00#Gy89@-MDw>@jddh3)aR-x+OgKk*D?15~-|$>u;>BSO5Lzo7ILuCQ4bpUOc1u zfg8h5Y@ejl-zw!d?R;pjkZbI4ifSa#tvqTec?DTYQ7?olGF(UbiCFQ&v?86_SM1mK z8-~;U&j0KFDXa%LBI}y_w4%}er=waz=;$8N^=fNt`xC~UL>Pb>gvL=v0z>`NT+`mi z6G++QcWBYj=8Lv4$6B;KjTWOjv^b?c9&O=hZ}BZ!q!J#{QKqX$(L&hjgeWG^C-{{C zWg;r-#9LQ`L)m_f58jW+Cl zazkQ8YIPpbfU1sel}=&)y}$o_*Ut zrS)spsDJCzx3qV0s8sqfb^;9Mww+KWDl235ehA)ZP3`1z8Nngf82bbiHN=d)P4=UR zP1M-^Z(}dYiecCykYpVt$3{h1sOx<4_&_XKTl4TRusJd?w-l5i-I2s&Y<0E zTKVgvEB_*KhNpeyeto}THr>C%IlsPt3T5QrtiUzT)5=EspYD&!T32cy^f>Ln5(Z-l zgNA4isnh_nNVOx#R(Mz%yDpUK(cG}h7?pWdSox;@0uddjwPPN z0{Gny=wmAK%nW$xH55_wl^!b|@nH{?*Y^28s*$=~1EX@mj0Xnas@gWUa>Mw>scYT3K8i zVyrmXfVUd3xq=r8WCueihTKVX2Sn8Twb%VcUtDeXHALWr(g%83CEt5B`ij+`7TGhj zU$wHSVUdQ+J)c*qW*5gU3H|eeKrE{;iKcy6wTon(kLB7jHC4zPnxD%$tvr zZ9SrgZu95NTA=>?`E+$YtZk-GDt_mq_ul^Gy$?RvvvcPjWC%^D%H9tfVi7gqI%cyX zM`#fnH;J*G8;H9|6Jj&f9T4vl1h8{9)!XE`b1(T=z?w0<+VE;bF zJ^N`6PMqH`apK(h<9qe(+Y1M9*JGsbG@sCJxYgi}Pq5<^K18l2H>EjWr+qt!6uHot zM_PCMvm*G%rI`pkt0B zT!X?uQN!O}7Vpf&&#wfvx^$CgVy}h$)8*5iI&Q*>3T!$)so{9_0Ka2V`f~eh>Bn2} z+bsp+w_EP4@M(^C#BaCo zS)?1O_ZZIpD?dEbj=YpNGrK)t~O1%zNG-=98fQM>@nV!XHDFb-5Sw z9py|HGMfkLjJWvzZt&Dw3>~w0a#9)zRHzQ9^ZftEN(MG&Wvpx3^8Tqnh@6h6u`iE$XXci?piquOd zaxu|SrmJtE1w}^DTntv5v5(mrhRPG*Bw?R7myH8P7WNCIL)=Y`{Ts>Vvo^kve=E(9 zmPz}i4`sL9Prgx}CvTCTlD}6Hm9fe*%4JQ3=26W{+Me2t+B4eAx+GnhZnEwV`hNN) z`i~3=hS7#KhGRy(vDi4lc&~B4@!PmS-1NAnxc`_cOxsM)n!Y#3o5z{gnV&Xau*jB9 zmQqW-<#x;cmhY_<)<)~QHot9x?cWfK3HFEWpV)tN40WtBL{I{#XHOIBh z^%u9xJGgSU^FHtWDt==8)&y6=goK9@jwd{yI5cr$;`YR* z#7~oYB#lVAC+TF;r=1*~iaX8e)ZFP*r}sL2lRPjvoIE3WVe-1 zb)MY$OnSfc8R-wFe~|u<3@IZuqi;re#=MNjGM>x0kSS$mWR_+g&U`)dgUr8l$>>tp zrJ_r9mz%oW(Ped)?Opa^<;3dogzZO{y#MZv);|Bn&z|4{V`mHU*3#$Sh7P^Fz4blA zZv8}j7r(Jdf65!;w>BZw$aPBM2(Ybk0b8!gWmcFd+e+-7l$9;-@*5<*jXviRT#5?MatW; z&mVAaGMk~?${cv+xbgzj)HIf)?8Hw7EW|uFVh+1m6Y%xoGpLMVdGeOF7G)>)gy#b1 zuUJGr$L8X5uCj>Dg&s>*CbCS78G%o*Thg{|RDyIK(amNNab0_5(Ek6KMYgKA*<%t@09^eTD9V_8kwwQ{uazea8c|7i%ll z0DVPt6WJo&YV>mgp8ihw<|p7a;|FUYHPw6^OQ1vW_Zuuh9CBYA65Auq1pmxrRotj9 zP>#iT_yl+a2WaflHLzrHz;+}{CGfd4>}lw3;Se+Z`qsS=y?vLrs|yXgNn)cy7=<4& zSvkV*MO(dQy9U1r%TuGD;HRnldp&-S4PH6oO-cEbN&gHnA7WIoW5rlrzfl7iF0{33 zQ&ktcTfbha^)ddixTlC+E5@*)1ju80-h}!d6lf!!^Wn@0i#CYe#a?6Qp!M_kDCuSC zPtwOemoL$m;!E@O_LceO`SztbU}Z#4gVMhqV|bjaXA11l@a%LerC7b?B3Z=aIh#l4CO3-Ws8cF*b7B{L%(C29WDc$XbN z*<+3~8uU6X_HQK4y7?l!zC0qQ`|K4H0_A}T19Q6h%HyY%<#a0#RMba&6MPYTC>eo) zxPwc92@zktFOq?e2^}uiM?z>h^;a!J(UzerExFCthxHLd1bmS<$^yP)yl!MI&exX( z!oJ8q=zJKRD;e~~j4ysao*=9Qw!ZR6#qHD9l-C1Cejv^`ATVHxF{c|lV2s0Q9L^$L z0<#YAF4u87k-C)kJ|Ho@SqzJrmQR=*sTx^ZUY6wdhjY3OidX{Z3Afk)>N27o5YbVW zzUi1%gst@*=yqz&x??sru|C^0IWT#`xY~$30ne_H%h#+~8L?+avI1q1tULb_4;oF0 zbPJS~N3un)L#nTgGvw-!Jfcar1$=A%%`lz7Kfc90I$W6$yP{3E{hNuK5oth#SJ(Q* zUs45DWzCw3fUjar{hA5K+LlZV_-uhS2TZ0lv&unkR#h9}xPE+XQlw&CIAW`x#(M)* zntDa`kce~S*xHDcUg4WI0mQ(6r2&7hB)|Pi8+7p7x1lZufH~w}FgwZ!HMNmY87LN-5Mz?^13hx_#Dsb**mSY3 zBWokMfmsn(pnsH$a6zC|K7CXzJrccI9&rtb;Fro{PepRe@hn)se2w5Vfr98OFtYX; z7Hs?UKu=%N(?M+Wgv)R_;u!!g%P3z{J9%m(wLWPwr)JeKTHd}Qd2u*RA9)+I&7uk65SCuM0ZMh`LDVO)Fwr{0Ru+#>3UzSlq84I(1r`X z3Y-M`_W_LP()BoOAUItWjN8ADua+mV_SQfnlI1I(QWk3`zF*TRzR2kV2DbO66<^WM zfPqPVh&cV_bdzw~7aJIl>jhBHz9O`Aqv?2LIpaamoJ{v@u1bWSZP)G>#wBF#xHGx5s*91n@ z_Mz6$CySEq6k|Ks5I&@)e@-{3w*ChKeAUPUA--x}ni*I}6g*8vf&DPjyv=^u#;^cUAl#r4wYb*;Fr3-ph0 z569z6Aa_*}4p=j`)(?^NC7w-MWBZ3#sW6nv8rxrULfZ`ffxgi`o-#UhpgcM?g4Zz^~om^QjoFln?W=pJq7*3q`0b+pww!YZX&&sim_waqGNVed!t zAR9fCEoM)#e=^0!_!8tF_%VL(ftpd-*+Y)$+F&9KRbwN3RV00sfT59f5$&o78(lZH z_5kPigqN>h&-y11iR6!}jrfwoLn4!LVoN^YVg18%=VoV*pF6JsDYWeDdD(O4(Mda? zukrXfR)(DrFB=Yz%*z@yN3b(+%^&s*Tx=t<64>SJ2vwK3f~TA<_qF{)UEcP0^$A>w zS5I8?`2X)O(b$l!MP1k@Y%ANq?qS>5D%QxY$PS15rwB#}9w2y- z;L`*T6Ffq=9VK{-;4=iD!(IG}HLx-geT+mOBdYGQa7EC^Nc1rheT+mOBNOy7GC?0B z(Z|RHeT+=d$H)YIj7-qS$OL_iOwh;31bvK5(8tIGeT?{jB?u_!W5n+#3n=JgWP(0M zCg@{if<8tj=woDpK1L?!V`PFpMkeTE#7?4UDd=Nlf<8tj=woDpK1L?!V?>RNfPy|o zCg@{CY$KqckC6%b7@44tkqP=3nV^r63HrpbZiqLmETe5ZU{`{91cL+%fwPqrwVem- zh4xlfOt6IDDr&QV;JpMl65K>^Gr{`_ZlN9?Ah?y_HiFx!pOa{V-$cNC?SzS)FtIa% z33ihFtIa%iJb{d>`Y){X95#D6PVbUz{Ji3CUzz;u`_{*oe50r zOkiSX0uwvl?Awk?QVquH%!~vxaJMt?5wIHvKLIOo9waER>I{7L0~Qk$_;dz7qRj?^ z_Y&Mla1+7J1n(y(#_f!8Mf;bjx3hrh%!=O9nVn!~+)W34UI6R`{gRHc1nf=MOX$20 z!A82Wl;ARgcN1Jra0S8b)bb4V{3;-7J8?aO=7?H9Iv2Ccpjl+lEHXeN5+yiKku# z%pnTo5C!mm_rQobw7xk+fgGYh4pAV7D3C)G$RP^k5Cw9G0^Pwm<4~h*Bq*qg!Zd=S z&+gP`chE$f7hy)-K^bvgOt1vB>P{nerxCl;h}~(#?lfX|8nHW#*d3fKdU$}~R)X6I zZl`|4igX7@34G21=F#fp(dy(8mGWqH@@RGPXm#>vb@FI+@@RGPh?03k$vmQD9#Jxn zD49o;%%j!Gqt(fy)yZd8^(U6k>;yYQrt+!heCjhFeTpkf2`(deH^JouR}efy&%O#6 zB+P?^d5|y<66Qg|JV=-assA8h9;8u%gn5uK4-)1_a2(+#Y)v6%C!nx3g_xay!qyaGb^;15R7kv3 zNW4@?yi`cMR7kv3NW4@CdnDTLB>W#HxQpN;1a}jBl;9p}`53__f{zp2OYkXz5rPK@ z9whiQ!NUZP(Cm&9JVx*tg2xG4!MBC5O#+`6Xr?a`6w+Eq(prQyI*+0Xg(g3|l1N0^h(3|X632DC)(t9PeUL{zsjBE6$FK5E1`Ln(7Z}$UL`cI5}H>D&8q~fCdS%H@L__x2tGn^ zH^D~ zSRaytJ|qQwNDBIp6!amU>_a@+hj_9N@nj$3$v(uBeTXOf5I^)KAASIQk8e>`ZY20J z!Lxv6biItOmyt~=W5TACF=126n6N2jpuA`)G;kSw25~N)Ek}%)1!yGrGQqQemDFb? z^;t=MR#Kmp)Mq92SxJ3XQlFL7XC?JH5PdGhzJ`(D%LLB?4yHZ_Q=fyW{a|W8jI_Zp z(gwpw8w?}aA4XC?jHGfHN!&1!xM3u5!${(Wk;Dxni5o@|H;g217)jhPlDJ_cal=Ta zMi34o2!|1b!wABmimq4D^(wkvMb}5t^^tUaB++3c(P1RfVIWE5pM4vjMPaV;x zj^LR zOBjwN4960NH;^nhf;VO(2P7iUM$)~Fq+(;U@5uUJUBO=g7c)|jT2(*zj ze8M8VnCMMJpi2pdrG&#$!eJ@lu#|9EN;oVf z9R9zu&NW7os*2-hhFup>B#6ZLg`mb5V_aqzj1eCZ1VR)cLX1%$x-PTJ=s2_X><~3- zOxJ@3>~vLiYP$PQ*xgyv4~@OuEw(1pBYprMVAQC2K&=8>^LPLax2n`V$A~Zy3h|v(EAx1-th8PVo z8e%lWXo%4eqaj8^jD{EuF&bht#At}o5ThYRLyU$P4KW%tdZ!xESPs^|ixV^?Xh_hI zph10P_VM!}L4&?+bUq|#NYId=Awffeh6D`>8WJ=lXh_hIpdm#=iiVVONYRj@Aw@%q zh7=7c<&dHwMMH{)6b&gFQZ%G!NYRj@Aw@%qh7=7c8Xh6*ufbk}y#{X$-Wu_1#IF&* zM*JG_Ys9Y+zeeOoiS`)waqQQzbv~_iKCN~2f6iN7NA$F;kG<4&L~d`w@8cMC^36K= zW}SSqPQFj2w*2y>PIxgSe$1&=B-WzZ=;A+6tfU5yl1Fi;K4VB>qjR^agNdvA1 zTn)Gya5dm+z}0}O0apXA46Y2W46Y2W46Y2W46Y2W46Y2W46Y2W46Y2W46Y2W46Y2W z9IhO$9IhO$9IhO$9IhO$9IhO$9IhO$9IhO$9IhO$9IhO$0-ahOlrg75D+b&CisBD9FmB0`G@Eh4mt&>}*M2rVMC zh|nfNn+R=#H2puAHh|nQIhX@@abcoO)LWc+% z1y^gSabm3ZB{Uw)wzs;0HYd>L1lpWH1{BDEg8CIf`*;Qv)cf-NJp&44K!FS>kO2iU zpg;x`$bbSFP*8u*QJw(>X?E)wP>^P~o&g1EcIz2XpsfqEb%C}n(AEXoxlsi`&&RE2KtVkpx1Iq7 zt~CTQpg;x`$bbUvZBW0+_wfuUsI(K?W}I-Fal&ntbCAc|)osq?ZIy$2e4KDw<>1!G z3Aa@aZd0s}6K{|x>! z_|M?q!M}rl2mcQKv-r>AKa2k?{x1G5{w_WIE<*df><*df><*df><*df>v*b&$f*b&$f*b&$f*b&$f*b&$<*fH2K*fH2K z*fH2K*fH2K*fH1%*a_GP*a_GP*a_GP*a_GP*a_Gtg*|Ui3hVaA*k@(+UHp;|#_bj58Q#FwS6{!MF#buLQV9&;E7BJs9_3+=Fos#yuGKV0?<6lCL!QgwI^m zL*01N&3t=NtFvA+-@e4&qnU{p_tAsjbPfCB_I};>>i+q*-`VWseEZePWn;VBPS~=o z33;y_(d&lPE!%P1v{n6Iv76;N${r8OR=`Q86JX2<-3{>y&;po{!khoREYgEqCM;eehgbD3)A zm0Bluh066xmDN=$$E$T6`5LVlc%91e^}5@S?(wZvAlGW0z;*Tp)!mzPJ@L)DGWQl; zD|@TvlfF$F4ocUOj`gsvsoZGq(0KYgHO~Dm9pSrGOYgP!=^mo*SJ~bo<+n=p?HcLv z8K@uBJ&NwM59?U&*6N>+s4nhREqzoa`7!0=AJ;i>pX%}fJ=gY=_9>Olx9uCM!^D1| zzQLa?)hvd`)fRtK>z6LE#}@XP@-97F`(Nq_7Hz`>*c)uQtJc zV(0ABD$`6g_cN90PwhGTv&!r@x_{cQG+E@h{X;V{UbN@!1=Yo0?Qiy|eMYtLS^J!7 zV@>m5*X{GFE3fHI)#Jmey}#HO>`V4VjW&J7zO3usJDPU#Rr{JU-V1u7_^#GxjBR4S z)!d8U*?07r{+@l`p0V%hv-~4_#GbMr+TOx``}@KxbSpq#ta$l?UqAn)X59YVez9+D zb9ME==Gw~A(#^MCw*K&PW#j02WqIFio0WBU-+s%|q513KR~=j5tZZzaSgx$BSLV(e z=C3y{9`iH9X9QoWdcVRBXm;=12TD@_ZlM^3H@uc_0l zrSZKMR#%Q6k?-Pu3wqDr^=Bh3=uGg}{bG2n&Z9T#oOwa~cc{jn=k-G>=|%njYuUS0 N{);*zv;f-f_&-d+7j6Im diff --git a/www/bootstrap-3.3.1/css/fonts/OpenSansBold.ttf b/www/bootstrap-3.3.1/css/fonts/OpenSansBold.ttf deleted file mode 100644 index b6abcea4417074888215e8d6c5223f271862c6fa..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 35760 zcmbTf31Ade@<0Awch7y_xigc=K?orvLlTE@3;{w25Rwou1Be^}0YN}yS-=R0h@gmw zC+jLABFnlMkVSOy00hK~b^ZEtU3A6uRy@{K7a{5VKlOShfM55&zyE(i*YtG1ey?6t zy{dZk>NSir#@ql33l1MTtcE$+yNunMf~)@F4P(YKA2Z{3AN;lsA3Lu4y_f&K1;6{_ z_jO~&mXvK<{4mN+Zouy;)8|cHaPr1$bMd7l*cgZAE`%jQ3*f@|$MOnA-a9502Xzn{XTM zSIoi%d!b=1>c@SSJ8Rx`zy9di(ZFrOi;T&$uAXu2HIIC`{X?{Oma(im=FXo!b&u)( zD#lv=j5?p0H}%&Gq^qQC{3iT@*G!!^Bjt`r3u9|dk49Y)SERI$ zC*%rM;y5Ia=y+#V<6D}> zOpH?-YvdhrbpqG)m_;!#SvKk=gN(`}ua&tts(rPrv=5h2GYGW=g-J+O19JOsNT(jET8paH^+wM2IS04uT9^xXQ(i%fE5@W zVOJ=W%3Q3tchAfM#%#H+kgK35tsrE|(_1qF8Drw!fZo~=*Xd<_0Dr|k#s(#N>U@n@ zTI6ywt$WcZdJ1vTWJa8qm5D2$fkqI>5%=m1zHoVdfy?g?xC-*~%llSTmPdU4fC1OC zBwgS90$&C9`UB;9W#}g-*L{EB@*k!QIriv>udMs{>B$dlKl12k_06F}Z&9xqFmx3^ z@z5d9YbSJ#+*nkt=M`!7Pp#ebC-41to14Cf+0}POUUSn`J^N+<6p)_l70vq6!*py= z*Vp?7HMKCD6?TSumjsJ4@>5gvffU(ha2vqo z7t00>BADo-^Mx|E7#@ie>YYDQR^B(9qt^+kE_a5?{CPagAx;1L2CphEn=+-WnEz?- z&#xN=xm=vyW@Udk56qQ$nbnP>W$*>CfB3R2V33T(0g>M@dKFq8#CX?}BVZb^wVElqJc zdybAf6(uw(u6Q^^dQcHd!Ju`sXi5q7Qm{5Eh8bxDO{NnZ2h&lav`;8hfU%rQEESB^ zMz?`iRE988^N0qOT(9SS^Fbk>H&9WbXX@HT&;Rp#^&d+&j~x2>k!RjtzlCQE@5=|~ z-q6tT!m1fJ%ux6B8^W)ujSd-o<@iYp*PMQS-J$03zrEtVXa2Bh$CWt)voEQ z$Il$V>v~O*ZZ01Xt7@6k=L*J2XYdDv&TvD?$%;hE;x*9+O;HFXq3H*xOxC0xl$N5r zjRj+Ni`gtI3NsiSmRx#nka$iT-q43mcV$E``MmBxIA3b|&7J2q+_CwVvzxa_rQF0{ z-+f3e`~C;D^66dt7}Y!gHMb^fMzyFMHQUib?$2xHPRS6iaF_R$3L<{D)cTt{&#t}e zjt%FiYV{|z-_8U4#E;+e*AG3RmZIiC(s(6P?`3vY9!oJP|Rk7f!l0) zBTUYq7t3fA3US2%r2*-V;vbPAFQD^4jTU(FDs{5dUdR`R)W_fd@PTz_-cxrM@Og!L zuX@LCu>nFU(kY1ErcGGxnYvzVA(ky!~EAq}84 zhbGZjs5}Jef!=e4`6;!HuRg_Bt8J&G)>Hgub=fI(1@%Zh%U@w%Gd=S?1=FF^8Dt$R zIVQ+|7#coLFNfWgA^u9=>)#!m%TwNdS^bim&k&XQPHDWf4I{zzM?9n85{wvG1~9BV zo8;!W$-^M=TJg$@Y}4YTQQFvTk2vVfCT=pw zjxljL6_{w_uiFAcEiJH!>l{})x!hTP#Wi!MOuc&E zWa*T;O1*<$&lmC4e7?F;yw%4#^^AE;3S&mjEmk8$Mo~<9 zo`P=B=qB?e7>Myt1Kd?vsW%u3ctoyOUy*gAvv%Ii-&W=NTkjj4vi2Fi1U1*g!Zrvk zG$59hVdn3pCMl=nheQ9lxa0+1wh06Irsaz-vL%~1^ z+Ju}1H17*34IL7n|43`Esg2{dUcPhg?K@|!`^$C1?>=}?YI~b6dTiA-RW0M|YmZMF zRoJ@kx*2<(d3+BT2HZgTYT%a7CdNu~0?>*EIU@t^o6S(rBb1e!1=^D{q zeZldD=1tJjMCZoSP{%=Ku+~~?MAz7lru8D9+Srk zGdm`p%9!5gOR10h^m^-XGJZ$cnQ7Kn5Rxr{79*kF0z5RsGIQ@OH2 zn)yHH)xW5pet*xHzf9)o>Z$UTJ(gF>shvNjhX=?zzCQVbdUg!A^eq4EJ)gB&`dmGy zeqgYJjmNohArm{QR|iKEI}Ic>MB*PPCeA)BpD3-_^5U zZ2RYG$vJ(_^w!C1+N61WFW>3-w|C0HKkWMPoiEgH?%~1b*DSw!`Lf0(+ew-$#Yo!+ z<fC!$Ca5v=RA4++hB}!`N+e$lE4xcBL zCMZ#-I|0pF==(YxKDP+_5!S<@Ti)>Ia5jAIIM zfhOcGkXUJCp>y&Cg%d#xR4|MUVticWE#%7NAJ9N4(0c@h;2+?ZRQDIouV24?qx#7w z->P4)+1z#wS3JL-wdmS~E8hCYn5m;@Osj9zop^rRf+vQxJb&%JQ?LH1?Qq?geOLeX z@cDz|r%Z1gvbcJh^lIbK{#Tauo-$}y1C5(%@VgHDPGxy)P%N0K^H{CnF!Qkd0%x!x z?sUq2f7+P1-yj|GKgBn<;arwNAddO|DTJ)baMSzKKVEKY7#-fBTZV z?o;1Cbkp^7u3z3j98b)<sdF`u zWdZ{o5Efd#s4;%fA*^*tvazoNn$?z0B^!f0x3E`~C{&l86~vr6PWIbiRAk7p#C2?d za4671Qm&{eUe0}-E76W@`Gd}8>G4~Il;6vs7BD)ZFA=r zI2bp{jD^FQ&GE3uVIC8AD9K?4Q$%(sNemiZg8H14wir3#9N3wJ53Yx{y=1=aZJIZG z$dvK-yfE+mbFcra^|mPy_3fme!#}Q@a(lzb$^8Zoop!42*rV5MZ5>|MzrVVx+y9Z+ z%&wXG&Z*{h8xs8>buk*ckz^yx!E=IZOtg;{lT zDo|O8`+EKHNjvA)U7PBh``DgWx%IE(PYwx;ijBJYUk|*j{-1|<0Z*BuF8@F3dG#js z@^|n_GtWTlLn{Z*nOVPy@IA>E4I`ed7-G_-pDJ z^_`O97bfyMcOTs2=M1UfV3bPzSR3ijul1tE!vQjyx^UFEvUPkgh9Dox?L94@Z-Far!Jp)>vHw|vz_npihVaMT)yU!msc)RJ9PW^99q58WzOEU;ic2^qWTHV zBRY?&tEbJ_k5RV-n)(fl4?io7r5HROOvY^iFJcy>;x5IYGwVjh&BAXd*G%|hN%WwZ zb08m~vPzdetVu_t3}J?RIq!)V`1~!W_WfNwr0(9qE8lqQ?bfCp$_e$SFV(5&pV~F_#SiE}eB$Tqi3wOqszx%^|p`aY!btY!J?R zDC~*^b&J&*>hcJ&aITHFU$=p0DPLuVEoDt!gCb3BP(PF|yldg~=b?lexI?wQL zRF~vMv+DDzx|XyXT9s9_YGQq3X+~MLz@OmUOpRXD9?foq5Re(X(2AHDhz5Ki{<(Tm zuIc=eL&s4AYdbYA>I%TcG&U+$kd~4n*=;sS@??07#&o;W;)Jk4>_BFVlH%9-(Kj8K zD!f$Ta2H+REGatiN0Zl(3;F@P6%LmHBOWty7~)D-NcvD3y5XlA)jz6_@Vog{AG~qZ z)<2y1?#MG!Th%Y+@=kN_Jidm{<3mjwnO8_dc)7Hsa~+}$N2CFu zZPzTdiGPijY%Ckm2FVB?872i(fXW~AVt0p8qlab@G>}lOQ_7xQ-%vfXg;#u`Hu<^a zU9na-;oQzHrhcE`qpkt9T3K~0+bT(Biv@kK8)co&hM%&@)9-KwryO`TcBZ{sbhB+Z)K`6D_s{c--!PE05@*&T$|b<`)t09~i& z&~E5dLP`^~f(t6@JpjTq>h_q4qaOs^E*#L@iLsAH6A_c-} zk|{K{pj|g25;&(jq5i7#CV|9SX}Q6{14@&6s;v{uI{!4!{FSs1ng-fV_o;{s_(;>Z z7zn)OP&c$7l0K{LMK3 z)-zA@Me4?<4@&Q;cdN_z&3qpIRzWM>^}|{I761AtvRtHpcA@7+xWmu|ipk_-cDuvj zwL$0FY!0W>I4bUxVI%&7F6h?&I!u7YY%-|uuV-$&eaVUq(n0kd_1iTNqBjwW@X7jx zbLY)^`OLY_v%38sQ|n7$!-xV7ctq8)96eks#O;iV8KLKNr`en)8(;u{h++UybOzAl zShxD?9*GG*f@mWdAiD`2aVdSC+QX-)i`4G}|B*CIO<62)r*?P>8Z- zU0DF;|LfMxw{5&`6{~T3U#ObY3e4S&u?*h*?9{EK?wBR6L-_(DfJO3#cXJIWf8IM$M~) zFA8hq7xYGuCKrAt*;e>m(7^tH->(GJ57jUB-SyhIne+NwvGL}c8@S=KYfmn0U3`CC z%jEpAzj^IGe$TOwT6nO!qJDJIkby%7UAN_`!+)V)*KUlj$*9ZC@?tI*=U$7^ z=y98%Wgtt5p`}F(6GO}8)hiGl(!ARA)TNueN&Wgy>L=<;y!@8m-Uo%=QNQi`8+quw zyt`x7?;d<;m)wSy$p4F=B@4yZWXWXG!JOJ4%vJ_MC;Yu`c_q#h*U7^RanP@#Qa*=h zt3%zbI(d|P0;PIOObZ}(Y#IGpk4c|sZ5R%sjZBLDm`x6^N5@%8iq0WhGcqzWv#l0O zR)$Asky9KFF4n1_FQ7Uv^e~|{H8-4emYgpYK*N!%=>ZlMl^%R2PV}|vL&q%TioTES zC``evy!20{etnVWEuQz5y{E<8%l!;5m02O@y(+$mbi#+}_{V$OqTf`@k&f3Y|It|g zd99p993|R}7ql4~3tDtAeFl?3Z!+u6WNu}}YB5SW9m0?@C(lZ#dZ5^?>yv^>L?exl zVUhf&8?Qd7K90YA{A0BrAJ3~W{i;{XrNYj)rSGH{JHM0cokbcBSO+962mOw)rw%?9 zBSUX8!@&ZA9ARftaat$?!cSpPO!!GK#0W*3kP04>R`60Zk*>a~rt=1Qk~E=Xb?0%Z zL>7J(hM%fr2j%*%TFhv$5`@TtB#0u0AJL;cB-eNBma+bG8%pz0$~*D~eF(CV5wkEu48D`e ztXqji@wE3eIY@h%0zdir1?3@sz$YCU^!-pie$eB}JH3up`)0g^Bmjwxhu*DH7K>HJ zx>&y3YP3o@IVmZ*nMPySnmRIWwd%ZHM@`%dpH7!u6W95XpFlQMo63l#w+qfCi5|_h zLYNHeMT`k^Tv}^PO!BeZj!C|l8_P4RjH4e}{qWO2oj<($=0DCj^yLTNs&D*i&5d`> zS#jUgkq36|{hdi)x~uW^885!n8IVBZmId3@f%87BCb_XXUL6Z%%5uo$wAcdy zizR4f7N5zfXZp0^alM~;hR2a!abfBaO-U?~i7;PcjFh?Iu)7zp(V=c;22S0R+uT5 z6BZUTL%lS!^GB>lm=155P<#ErufJ}&XJp;IUTFZ&`fvoaT!z65=of>$H|LuJyzGlA+pIZ@=jrCR&0Kh`mzQw|hs{gUimn+k4HfN;x+_JkaE|V9<>f$!1!B-PET#Tm(aCW;TWEn&t z25bvq>MZ=sNE!3_LSkJ5kr%x*f9f?x{31qY2)M3!$%w`rX%e-FRou-e-Cg(1?e1mlx}^!O8xyEUzRPplsdt%nCKjNxo7d>IH2AodV(^;sp*91(980R?n&@ckVoR^162_8P zbz0A!fk0(AJUGq9Y}}@|^)>Vx88-!yEMv&;TPW4V3k&n}2aSy9JH5qqac_E304Yuf z2NjFxC4nf7ZOqVtH_4^2Bs5YW4%)ejou#hA&CA55r<*KjWD_P}M3zp8?{>(Lt z9&BDXf9$yN4Lf!!lYdh@@``;YWL<8r>Id(C@vo0;o^ea2cVZ+qt}uV+wNJg|QqC)b zYA4hW>N7?jJ#o&Qi7$h9TcMSAVl?=$_M8UO9dMYeMx)8(cPMVRGCb~fni0SR-y+FX z2yHZq$)>PsF3ObnSVd}s=-+C z2Omg{=vLf)_wX_21IlD*?XEV}E9$jDg_Oin+!)^QPXbQgh`5uP95h9TdLix#HH|O9 zNw81M)5S7?@D}xQvca0g%{3!N59g(?FA&YD-qdeBl%;I$PbY_jcBirwnZP8^A_po~K|E6$HF# z047W(x!C*-dK^Wx(uQh`pfDR9%lCRbxW>&H8R_YHHsn^Bb3HbjE2wjUbOD#s;>h5b z&e0rR8_WV}BBO@A=!Awp+R?NjMt39-si46vpr3?ByQQpCPc~k@c#eAV^Fmkgu4~T6 z(~Fy4K$m@jQuy7cj*o!=>wH;%r1d;Rz$Z+8~ZwXM68G~Wrly%b%91p5WL zKAX-(xDu)wrWebvh9tS2{|h(2kA!#pWRhMW6M6F5BQH~9zdt4rXdL_Iaq7)A_?92A07PUg(-=9}j&Uv~A} z<;&*EI`y>L_3)23@hmRmODf&5>vxas*zxFN>No1E8@REZyLq46)N_QzR%pF_z`_Gt zKO~lu0=M4`yO8NLID^of%x3crhk-CU4CyTWf=Nw~BAMt#>Wlu!oE3xxTZmB+Sbndh zmy^~Wq>}YV7dV~j$+JcFtN(KB^z6g$32Xn_4DZI<{A!iHZqp8|g@5~`dUn0MSr~iX z1Y=M10;UTEy@KSG_~lF)%Ot5eCWNok(gThxzt!zFkiN09;c;s>@&1?9)mD)6l13I& zx9$jAcI54QK;6A_ z$2ai$ogio5hUSew?dNX|xVo`f8wv6f;Oe9qrsNj#&Vhx2yz)CAQBQta?C85kS!7cGVZLW==W%87!O4qAYRUU~9Bt6rWwt&QlX+H< z?e*p}t2f)4ZO#m2*2Du&*<2HsFQJ9tR8peEssb_Z>E$`;`9#Po8s(jL~3EvXnTd5lbJAsT4tI^@`c+5u0Wpw!iX1Bv#6Sr9%4jotr z4_K(}$RQE_OfIXFfRPiDR|a>3Twk*El@T9BoV|W&NyCC`cRcmjojY5OV9I=a#QWh7 zBTqjqrLUTK=If6;KOQ`gaM*$|hZrA5dRZ(*a=E--Kj!{Ex5**t>^i$>TX-1S9PGjr z`4XQSOiF|SLN570p|f<~qN6YIQX28RbYuOvH;+m0bS|O+FWJv;qjvF8HlSS#>lO1_ zkj;cp01TCcfWC>N(`d6yOwP1nBy=B{Mlt`6(EOY8UFvu~=&!jZy{^aGe2_X`ncTU0 z>D(!6q&BS$s9^n3w2?`93V?3-AfoLmE*57ys92h5A!~&vV(dh+qs@MtX5o3 z8`qn9n{Vbt>T`T8|GMK=WwPp8^Tnt~$4M!jpZUj6y&|Lbd@ueD5XUSSw7EynW>hR! zj{u1YQ%%gx6dl)DFekSmhGs<+0CY53dvO%E~ zP7Ct2%p!<@iK9cpFJn!dOtcnT)V`9u6*MA?g(w0oaEIhw9UCOQnkrYTM#;QSI`sLm z&PKG9jXC^Vn8RmNR7Ca~v$I_(DM4FCMo5u89vh@7*Je#j=c$XD^k`?12+7L)`BUS6e$mQ9q+itk=@b}Y4>OcCTuJ!xF+RUr=Z-+19MMj{EJUfi4K_%K$9Bm?+z>l9grMI6A zp%0kF%SQAehx(8Wcbz$n##}6VhO@KmcCXIsLrggl6ZyqHAZd_c)_*h|B!|b=S7zBSG%k^2YFG= zQ2B%MMc1f@&CSiBwgYyNqdRy7Y7@5HL&TjLcNen7GkCCeC!m zRQ&1FQ}xIj(o)LNK`irKlrx0JDcv&{ljLNIIE<3sCuZ(G$|IK|>ZCW`+`D59P2HDX z_f^wPtt-~=ZLi|zxQ=IJ?|9HO_{+@P$9}Iqon5RBFdZc6fX@rzPte3-WkxVvQ zn%^&_I8)qiXI8c~B{iinZc0sM9+)Nv(iKyf4hUb8-lV0dX&V|yg$mvP-Gu(RFad>$ z@*3b*kTjJe{|^Es9XxX6ir+4(Z{|zXb@xiIpa1Nt(R=rPtb3*DlURK0p;H@o)vFz6 zdtKYQ>C}-E?|@?qnW}`8U7%+H=EylttH-1Zq)A3B%H(9QjEo+I0gp3HvYK>8gU^?3 z$b< z*%MdXv#Pwj?amcf&REpkwrNGh$$1Tp^B0b(pD(>R^U4*QSCm(-+PEry&DE3IHnl|} z%Qv-MF>CbvYw8=WSwNDGpq+x~ICSd5*kyLN*X^@GwoN+hGBHzx)sI{TDFwPApm%%R zO-MK3GICt(4trDF;BZ*EPj9^>Uopi=-4b)?q+-+5J`tYSAUJ>%VFGx>7xvK+5`+iw z5vr|4h%lKdK-6```b5PF>6UQ^>Z{w|D*C_ud1LzC^as1&w21;h00x>oLuz zoiSo>40Mm!?IFmEMl}_L=7ky}Mbz3TXYbg;!q}XX@2bw~-clpHV07VQCJ@lC0p!!$+*Xo^lvIZ-`%IK~rF92+ zV`AHm&@9?spuCIDd0=F$dgQ3Vv5|apWBtp>Jb!~%d>IU>5Q8TD!aP6Q0wSy5t zqP$c6P>gFIyy9}q60&8x$z%8A_s;kC&hlqfRO&2Hw)jiynd2!-LmHKECB&wkZo<-u zCP_lgCN+%~Z544PjvS*1a*TXl39DeaQYHL?NLenW>*rEFlDuN-oL8bZMSp$MtEb;P ze)j`)3p?6g;*(#d5ptzKialk{rD02ySrAapJin}A3gWp zyFb+L?5BP%o>8~Gd{o`>=aYQGF)DV^V4-%uo@`_kL`x7fCxb`3RxVPrbP3&sKxqA}tki3^P#4f<-c&j@yyS zjA4+F6a@Xn@D}bV_@sFr&i{iQ29ZNzHNbfY*22RBoEvza_SM7}ol-yNfm7-Rn1pNJ zrSo^y+Y#J7j&){r`x1UM?ZPQpXLc6Wc@Xj!(qgn2Wx!%1vaNsw!gt!D11u6^+2tW6 zdaC1`{J~j1_Y~{uO71d=o{v{oPnbA3Hc?qfSGP^N;^7I$H^nAQ8aQb3B*rC zk>W5Ikb7mZa*i;+(`B<-kP)OuEDXX35sYYCB)dftmo)q#oisNMb8@yX+UKIS$sb7D zPGM5A9D7~V_mNl%0hj8e=g>btVnJ@7mBT6Iu0V>(o-H9~GYHDKqqG-8EW=Z)qK!&; z6lAS0q<9)a(sP|lPtT0@>CrfS`Q~TWJve#QY(7P*+j*)rUY6gZ<-S#G7LU7U@s((^ zN{UMRk-eG62F5bI776YS3+jUwr{1E^FOa=npU;#L&bFIE2|Y;zAgMG+@@NE#xt161 zy@*z8vm3%GvCjd>>46=wMcT4!@~rk}Hr{yG@{KL^3nqDa}%yEFW=fXnh$h0lnh)6-~W=eI9Z7q8N+7Hm9!T38X@G0q@AF(xN>YV z!+gVlaKs=!zVG?r$~);V&G7Yot&DsTigh8#P5JP#Yzx*VO=)hdwgL52L%`vOJUL`7 z@J4}2ZSq75Hp$uX#T|w%6`5GHUPH205C|YFfN*HbiF9f&gfEKW>$(OIX$yCg!n z=9F@-b<{~2BIqiO?l5v1F`aT&L_*5Ohj(ln*!}7h2pr2 zr9%ED<{K8~iCR*A^b{iE2xVYRux~8j zv{4)jhQ;f2+PpT8$xhq85Dtet08Pk9^!fz4Br%Xxu@f>GVJfJMz$@X~?tQR+X!^v| z+8y$M5_H-)}{BUpT~=zm+JU)3$D!VIba1mI~Il2`~X&yyprsgExGr~0jC5;^1|j$ zO_>TJ3wK0!k%KIK@YF;1KmFt*_dTPA2iMjP8dO_5Sef+uLq{L`-QlA- zXI5`QtfvK$ALO$m2@gxqMy!%F_s+RCce9{s%ns(uoY*%l@kM0Du^Vzb$Ae6{nm!NpL zfxRg|(D@WIJ&9dy7&ztS$+G)?q3k00N0c?}m7G+RN=`tn?a(p#>^f{xN3Aj}qp06g|qrMs2G$rA2MON{R>FCaYd zDwHY1pX)s)kufYI3m+*}$=qZSDFb_;%EaEe3t0_9NsuwoGLgipib!;a`6Lq>!fIXE zkk@gq>bplhDs5Em>3j_tJl{!?^O=0v3X$@j$YO@6t0%cz0$q=car7^rI>MGpnT)Pe zUZW&<)I;M@*HePN+?%A{&r2+3lYUm>3Dn`esE!x9e$Yy!URnonKx<`o*H0*c5E~C^ z8~}YwAT5+nZiPLnjpafMqxl68rcbCG_&PEr2+mq)((YBfJBH%YC?JO2Y^pi9jg zKKn-9qNi4ofyU2_A^Dk^Ojer+DyNo| zUD%&YYP6DT(*`Kg$JMv)^5QM(TfFEV{Cop=lZikskT%~SCz4~{%6^hiAfkKE;3(E+DAsg7%feO zf;8M4;Q6%R*SCNpu~*CKJ$mbeZ4-`BR`0Ppo42+cKL6Hb{9N;Fr1gFhQLUq9@kLsG z@8Gp_Z#j&u3`p^${Jg|s zZvQVOUSM0a62T;ov^t1KS}U_f2^tYSG#&vHd=yn+QYA2146c#>S%O}^1_#e|GOgG|}sT0jxeL=ia^wv_B-G9B568GQHLNZExv z)pPe#TKis=TRVrgZn}NNE!WG^$7j`3NJ{=%?LT|j)w6&WWk=~|Ay=iGHOGn&*9#RO zg{60z-Co(dq@=>07BaAc0z;ad(lgR?cs#;Ne6EzbxGS-!CA`YS{-&f~nV7hd%_98l z*hNE2Zkjumbega%r{#SlTz-)-(U-P5DIfHV)x~<2SKm21^7)6;@91CtXl!S&sqThp zH8rCLu4ujPMu=}7m%iuu$~&>Cqx$vf=}+(5W8$=B^^fn)%=s?2Y~vSk_ud%H^bfSb_MHXHU zR)z@Nn%J=N3OOYhEc4oIWo4#{iu~;Ce#ItJG%pw~57x!Y%W0EzdU~WTp6;|2jzq${ zU+;I-U}2txYvRc6DygCDH(}Ab^Ug(vPh!^K*0zZLEQ1O<8ce3(5=OcXlZI}8M9cRQ z(>UbYUP!H?%&H41eLRQKuXLsBKB%2`^udRZeD}}iT@JvwVWyF zA*CtGJ$nJr3?zDm_Ffi@Bu9Qv^ESAP|& zVyRf*$j}*Oi!4d5j0}sVFvsQUk;+meT*M+`isbiWg&s+saA_rbUQOKYm!*+$yfEWJ zm^Ybur_F01DkLtN1|$DS%yvX{QZpC%1(kjg$#-KDWH^V3O~--Ce3+2r8&+tl%GHM2 z8FyU!LF=vu?o$8W^@I91uDthJjd4iZC#{lu+0{$u|9ZjlIl4f3LHpoQw{DrWQN8;! z^)vN2cYpagcTH2aExG-H&RKJBTzBVfw{Iu;*a}U&Q%|F|LCC@3h@h}W9FiZ(ZV?o2 z)a2x0!RMSLk1oA$V2jyW!2#(%l+d#mkl=8!UeIbF473&wYxlD*ZGkwb-Jgy7BuOO+ z{^8w7>^NGOH2r|=SH+=2l_e9g;3L`Qc~eEQ-Y z)z~xKxw@{pdPLpe!6WOcht$$HUTt#fn^7a{N7OXc%gV^njl*ji>(TC{u6@V>+9bS& z@TFcuUczgj>>D{W{O3s=|6jd^vI^xsN(;JS?vO1*@1xA1o35+8uixz*=RJHt(V%5> z`D<47mHdijSK|dUNE0faF}w8v+P`3nVH4q227G}d`rV-dv;~;PlEA|41i2{ek z14Iqkq5wvy$ZkS>#fRuP_El#?-}-%OmvUUpnQrx&WK-twxXCa3LF50B$}Cj2 zHlHNroJ?odLOw3!9bc5-#NQ~}Hv8D=_m96d%Wg1G@W){IJdxuhzt%WTq%?!T>jq9% ztBg!t`s>>I3wci6eWG4#eVUDz*HN!~CFB+!2>SYlSiMbTAUWvaxHyM*56)%|Yv#jFMz` zNT!uKdZS+&-jk=r%V@%_Ni{qX1Ckvokp zF6jGYO*-U>H!E+;b^5&`b{32|@D`9%>?|^6n~>Aw6EA$CcPWS#$eShdh;>Q7L98ol zA|Th@zF@&EYZqQ~$Ac9;dsg)6)3ZW%eC|yvubI2*rrE`jNO5uBzUa+K-_&#~Jv;~sp`lIv< zZ3jMH9{cr`KyipP+4diNM~$@?uWBF3OI# zfxstr;e`fxu|fBX7*Wyxlu=)})|F6R;+vn*`UD3fJ9#F*o#xEcm}W)x&mc;0Aj90W+v0`y))P34r zx30VA-don+EuGo&$oBj1+W})qc`B3fJgu1aiD8?pSSZzDBNS!GA@+uMXaPwI5DT58 z%_l*SLnJ`|Yw`2q1<#+?orp(csv-7!Au$nIW&gYGOJmK_)?W@R19No=`OlCN8EdEz z3JF;r7`xhw(THbaot9&}mb9tkt#9O_#0E0pMQ`O|Y*Ww6%gD}6^{1Px zE?2Har!(f}76vjijp^w2=yd&yi>}wxb&Oyu)>VGQTS?4V%|VWYTW7G->%vS-(n%h#-DEK7 z-Pm>KcFTq=nO0eZgh9?I@rLv(`N1F&(T5@yVZ6%|NrkwAcZF3#7a61<+rCy;@l|Kq z)VuYja>okkgM07YA`R|*ZTt9XX>$Y5YuFj>-PjedT7ey~*Tcnm! z?x1_Jd%gQOl56rjt2_riUEXHzF7La(zP?}i_WC~Z$NX#j{}V6;ngdq{o(Y@_oJ%Q6 zS(fr_@ZrXCKf0Yxd{a=Y!VZ)xjmfTY~oocLfiItf91bn)}~0m>vci0(;EcpvCyHbAPyGxf}lYjrr5;;2s? zVSKmZsKrs4_^zh%^ele2BoFxwrZ*I`nYuMtt(d|N=u+7d-5GX3S&pL>zh7ZXFa{4u zJGy4+8gOk5J7Bn#9ni1BF&Sm`iSJt6n}z(JZLAP)E8DF@xWI4_b&f|LRUF$`skDP_ z1in^$N0e%2lUcZ6OZ5DDxqk1Ka}oovanJ#uDXB;u+ALt|_eRoIDS>q8{1EN^n$BUv#y= zZ2((HwC3BpPT~3_ESyK_d4rYpP8<_J_W^?DME9Q^h6iyCd=NY!J}hTX&^h>0lB7G) z{^A38tP;OLd!m2xAleg;bnT!Q==@8EVLYyb_C)uK577KKp#3I%-;Co!LGJ|J>HLy| zWQzC!+FyJS?FDb~jk>lPPOv40H}UK#%w!(KT;mkx0FZNxnkIgbrP3iavqADk_@Ouy z?0%6YHck2tV*m#?t4q+=YNESt9V?^*G`1SIvO+rarK}M0bpX2mv97Jq%^07?4V^nN z#oln<|`Y!LCkyw(4a!88=8RLB=1VdkVdQg5jYng4MCD>{a$>lx<3s^#oIb z87LdQP!_Sx+q?eJb%~O>p95C^ z*Pqz%i4)>2r?iC!CGHYmYuVLYu zDeb|j!FGHp`QcjJ!KLuj_TZFYdp^FVUUYd%dkiIK{;Xt7D;eu9$(_OetUomo4z|BG zG#os@Cp5O;e8bRiJlOt~I3F#}m3;BTh9992o)B0Ow!vZTHNTp*e%KV?$oE*xL&8I5 zn2UR{J!T6|EjVlM5nix|_ZY~Fd?>*ZnV*RO4N z6}1E zP&gDKGTeF~#-`y%`^v@^?RSt(OW(_4B}MUeX$swWA$i9)j_#~X-sygPN*KHyIkshe zyOKAeH9QOyzjbQ+%4v|UImDQ-v)%qGYN(!J;bBt}|9&+q1uX_a=-MJp5Sm-sV?#l)*wloO z4BOME1W!zz0*1{dzBabBmxLFzd&AY56yXA)HEj0S7V(I7by&N1NIU*li^NmyCByJ6 zM1Rz`-eax^M|c(X`R`g zJte&rV{~S)B|X$0i$faX;g%V35>ZgI@H9}v2PA-8HMfi$8y?v>p#>5UiiV zhW)IXa7(&Y4TQDbm}d;ONa=DM1)aDMtiegRx<6pMA8AB80==UX+;)k3!q&8Wbo_?a9A+_ltr~~mS?j_-NFwrm`HxdJC=^ovJO2cg< zWO)c()99W;10>iIo)M0RX9e414J||>B9Gumf*6878V5%MVb8uE4N?Gee_!S%-Q$g%5*6X8UK4498-XC&^i%UtL-v;;{^7k^C zV#b&$W|eGG`W|2n%y8uy*iI8?Pg=Q+r|-d2z!8@Z@RfT^v2?A(N|cDjHH^pME7A10 z2`x`r@pg%H0nt!3eIPC=voJDXn}!8jNl>nj&sskvPJ@m4!5aMI?L0gXYzhwqB6@4P zIXt7f-4d>*>x1a}Anm%It{cMD?cC4t_)3hshIS6vJh3H&AsI|Nk-pyf6>%yK1+?Dz zadGTcQ>ZpLF39C^*|qYxEV(PYVU$06%;?ta`cbXf`F)+^@*=t8QaxSS2Bj-okNcxX zWo5UH;-hM8*`A1d946x9ln5S|xkDZ#KY`a8jI4R3=2VRwj^vEXh@_9hrn+%1?ilBc zIL1BUIO&l3I5>~6ar4;<_5}NeDNe>$`jO#yfZwsFd2CV9$ODEh7!Xs##CCp5d)`=r zvBnAQ`dixBxCs+m_HcfCe9eXptU7aKd)e5Q_F!gwWP2-4oSA$4tUA7EQ4#*pXVK(E z*U`5CbRs?}ld*ObfQPyt5V=}dMY-gI1(pC?j%dXhx_kkuUOLB9zK*-PzEn4M;q6Me z;#M)+`Tz6L=8WuP_9J2fMeI$smrFRu!MGJsF6%bNb-olhwE7$1v*va! z1gv0%fR_mv6|f3>pml6W*KWXJU26bq1RO5lh^`~JGDg4#0UO2jCUHJioHvW}aROd0 z;40D9jRLL~@FoG*2zaxATSU9R6*W94T7O8utpYwQ;5Gpt5pcUG`KW+91bj@uodP}~ zV7q{O1l%j&lLG!x!2JTZrvyA8;L`#=kGp0;AG4s3S zn79~Wg7>coNSL?;CN6=AOJL$+go%q0CNAtrB}kaK7-8aKgo%q0CN4&pxENvLVuXo{ z5hgB1n7FXoP4y5axlD()a+z7ceB8|iJ_LJl$P=)l^N4_iRW9(^4Hy-W@W}-}RA!@q zcL=yiz&i!pEa2S&QoFfmm&zX#wVeRWV-D1o$6NyD;%*-3a|G}*=$SmUMX;Z^UM0@^ z3%E*LxlzE?0^TIx8Ub$>5UcKZ_PD6|Wk6)m;(EU5BQh+-IrT1I^devMA|F(xE7Xg8 zP?aF{A|F&GNca~BoC^fb1sHd9g>WtqI2Q<<3k1#u;My5nC!7l~YN#aPT!2wSkZ>-* zs3Ax=7f>z&AmLoV2p3vk zQ!fJ+3knnq3KRqH1qZ zXKztwZ&7D&(1fm6qDQ?!89I*&SOr@37A^J`E%p{I_7*Mn7A^J`E%p{I_J$-=4fhIo zpMduZxJA@M9O(^-B79B&mJ05a3htB&DwPWElnU;Y3htB&?vx7dlnU;Y3QCp=N|p*r zmI_Li3QCp=N|p-llnU;Y3htCKhx#K{>s3y5tv6r{SkqAM6?nSm`4QW5rKI`U>*^eM+D{(fq6t= z9ub&V2#Km-PRLk=kgEzIR~2Y?A+8WlD+Es~1W&OjB(9MCt$;O|1UO8TtPyayfFlGP zgML-OnhQ9juqH`2ugdov5iZMcv=p4luAxLzNVvJCWMCT}cHiAUwD10`8 zMCT}cHiAUwD10`8MCT}cHiAUwD10`8MCT}cHiAUwD10`8MCT}cHfoXR9EHzDkmwwR zl_5xUjzVh@g^AAngkI_=^in^em--34)K6%DenJEE6B?kO&;b2}2Iwa=KtG`Y`U(40 zCA43a(0f&aUsd4O8u-fjXt7GvUnT0V67^SsUt4f}n1D3`4i|8QC{Oc?D&ap@fnQXT z{O2n0i_Xb^t^&Vy1Csw-g=|S`WtC|0Mgdm~c$0u@1iV>5(ri_tUsa-CRia;2qF+^_ zUsa-CRp1)6^`L+c3Hbl?b#Ae7T~!#~P7_Ka1VVri0;;M)h$5v;%1z)YqNx){DN|>r zhY*idAf!neFmbTs0^%ZO&Y8osWtbb|nb}s8*zH_EI5R^SK(=Wg3W0#Qw*(&GnM)qH zK9_%ead-fUSXn;aKL7gvz0Tfi_BylA_yTqXyNZ1Z`!u$V?O?mu9=4AiV29XmVlQDw zSX*h2v(g@Cr9I9{dweUl&vK6Cv2pTPf?1GY79^Mj31&fpF_~aYCK!_m#$DdLbK4k_Z0A`U6ykOG?mn+B_A z#uVo?*fiKQ*fiKQ*fiKQ*fiKcF-*HaF*IvAGayOk2E;QUo&oU;h-cs~qwtFCVaC#7#?oQ6 z-=P*8OSU6I{iiQSlz%Sj*s7i*3*98ggjJp&^Hc92#8ggjJp&^Hc92!D2glGuS5TYSOLx_eD4Ivsr zG=yjf(Ga2`L_>&%5Dg(3LNtVE2+#;goX$W5gH;i zL}-Z65TPMLLxhG14G|h5G(>2K&=8?PckgsXbT0>M;~|fRJR0(7$fH4PWX`eikVk`F zZ8RS8Xvm`>kA^%N@@UATA&-VU8uDn!qalxm7!5HRV&V{^Ax1-th8PVo8e-xQqaj8^ zjD{EuF&bht#At}o5ThYRLyU$P4KW(NMAct_y#RXw-U7S@{1@ z&yV5laqJV=FJp_$)*`dDsP)fPS5%LlleK#3|AShGF)Z2%5at8D#KNVs|;5et}4->s}5Hkt~y+Gxax4#;i|(`hpP@(9j-cDb-3zq)#0kcRflUyTvy$axXfBjy(B+o zt)^a*AG20dFUgNttErdd!Opjux`BrV9vXOP;Guzs1|AxCXyBoNhXx)Rcxd9GiH9a0 zns{j9p^1kk9-4S);-QI$CLUUNXyKuShZY`Mcxd6Fg@+a%T6k#Tp@j$C1y{DzePXQL z8PNS;jxFnYa*ikGcyf-X0`gQqUh4|4bF2dLT7B91Rsne`AWsG4sen8ckf#FjR6w2z z$ZNf4D64?HG@G>w$V;}m;?=V(7i`#IXr(SDxx^R%C*{XFd#XxF|$VK2~rf%X;J zS7=|MeTDW_+E-~`rG1t5HtlWN+pO^0tnk~c@Y}5L+pO^0tnk}l+h99jJ77CtJ77Ct zJ77CtJ77CtJ7BwDyI{LuyI{LuyI{LuyI{LuyI^}@dtiHDdtiHDdtiHDdtiHDdtleV zu7O>AiLuxnt~z^;MqgYARugYARugYARugYARugYAPIfE|DxfE|DxfE|Dx zfE|DxfE|Dxf*pb#f*pb#f*pb#f*pb#f*pdrBa&~1v*x7W?NS@*EJSI5Wr-NUl;I%Ajq|L^(w4EZgD9WA<3pl{RrAiMST|IR;*-vuG& zP_Reupcv`~=7yqO|6zESF-G{qNU!UUZPU$|Q|Hs@T@^`0v&AXHO?X3J>*T10l z1+~0i`#SH_U6u#b*L~{E-8y@>HjD7@#S`wt^`rl?dT4ZPo6fpP`$%`_`JtN?bNz7) zy`!tWCHfS-SLhwpSL!OfO7AznMo%8RR`GtF;{1ADgEzWc^*rTmdS>=^Ju~_yy&L#u zy|4Bbjj*@sDa&2rze@`CNQrIudWY`2ze{(a->v?QyM(*Py;pw?_6qn)mCD zknLnW=A5`5wt+6tr=N=w%A95eoI5_IQ;hu7lYLoA2 z4e>`8yRWz>l(WC)p4KxRkB@D4s?Xft-9NNeZn%Pb&i%ptP1*eG?qBYo+8MFxlsnuH zHCjHZh?X@rexiu}$o<&;NiqAi`-S_Zww0W8e{~i28~40>L0950+E4MA`p72s z8@k`R-@D&wZ^k9}ZTB7befKTR{2%Bk_h;O*ZgXshp5xFbJLr>WZ_%GXwD;M6uARF- zbwAsFdU1C4=Ec*ecJID-;+DBbkIye0o0~trec$5zoHg&?yL->p_q$(qVs3GMVe!oI z`BQWATa9nq`u_H9Cv0SlX$-tnGyg?h@iG0Z$3gk0zvQ9s_Q`{Gj&_Uib>sL}=^2|n zdiJ!i+J4RRIGj0q>f}+iT|aM3zq8-!FLvqwJNdpt46oK0x?SVt1&zJ~y4uh4{eDGx Un|}V4>;sDZHjM^tXK@Gq4RJiv-v9sr diff --git a/www/bootstrap-3.3.1/css/fonts/OpenSansBoldItalic.ttf b/www/bootstrap-3.3.1/css/fonts/OpenSansBoldItalic.ttf deleted file mode 100644 index 46535865c80003dd9fb3b1a48c22d9af8e226f1c..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 33064 zcmbrm2|yIrvM_v3chABwFdHx|3Ns9g1QB6`5m6bDeG_mr45ET@L5*9`7-Nhgf{GFZ zT#zJc)TlAW;1ZX_7`JGQF~*k|<1;2^F?&pI7Oz*C=BraZDCXw=?|t8oc1=(B>8d(a zb?VfqQ$2(dLi7LxV#-WQ&mdazDItqi!BxM^!ePUSFHynw9q?V9IebLwwRb;jgYWy{ z`|M%EW8*i^YduHE@FnoQ{E=xDGcPQDEDXMX4c|{a^7w3%VN$?kLPoEI@4F_>oHXr? zs;zSfaR5HW^+^>~Gl`M}0Y3J;deWowCMNz_e~l2@n~=N%l@lt)-`;Wi4MK(;gZqh< za6!As`(eOe4&TEnr_Fw1Ph0OraQ`+TeC5;$k4@k5|%O@zj)`((ns^sAAU5K;Xli7<6n1k<+WeV zDR`cwSkK1;Djsmb!G*V;%H(#gJCh?j;QE!*vV%PtMTjf`o(v)(B-tLU6g)k9Q11|; z(FFMF`|9m_&Rg%TR~ZewT%`w`DOP<_Qf%yKoz-fE!~Fqt6lMjZV_}EQY=gsK<*n>c z$gDPtpiZZpLA*Ts(>W)qF3-BDr@k2-dTO3~WzLz|muLT?cgf#QKgAb(_r6$3TiNmc zcNgh8aWXqDe)k=ymsmTO3*~Yj5=_ELG#P3Sj}B6Y3v%CxK;OV&PQ7o4r`)s9DYI*R zvSe~z?hF5V`w#+R1&(!A?fK|v9RZdR>WxXjwU1n(u-GCZb$&)eL_|WrM4Qd3@G~kR zBKcsBCMG8IgEP6@*T*QR?*10JviHU2)9+_)c~1P?vckNrddiaNDK(2y#jKQqIE#L8 zdLjMw&}H43v+5kGnyR9ygZ4l5$|cRZb$)5z4e<~!Su3hVmq*s%KFQwPAVu21VJ0FY zRh>8Gjk0sZgBU>zktBh{*!_F-wNk4!NS5MFy}bj2MSL<}VEaoiRxV8iW6Fea+@bsYi)6rW`gPv@%0tqRq@HDC?S^ zHQvUfnk=F0t1L#`ob~G07e9agWZsWwUOFMRoa~+b5ba&N$Mt4O#;DAyDV4KE4D6Mf z?LY4ElLwnFR4iU}@{1Rr5x;8||CLldO+0gm7Fwqk3>lfs%}TBum}DKD-3MF&Wh0CW z#}VeSmt&*ryfn6OTuDO;TIGmG_$+AUNmToIUKL4FQou84!Ol5Or!`o(oIfc~<(+@d z`C$zWpu@Qo>M8!<+9SRxz9)W3!O_yrY2p!X3gA!y4ka&0IH;E6%|xf=t$J?C?N0Fy z{eAZLYxq)er|T{8U!0j+O06_RybV0;;!=gB@^Io!Jod`H!Tgcaa7DNQyh3DnxJ_o@ z=ggutdU5xrTcvMbpa${vk+j$>`%T=~Q;ZhdvuTm|!`9nnKkufq0N*rnTL>50p-Uogp?| z<;Gv7v&6=$;%e5*Ht{yCCO3(ksP+orz+(e}&2Xb!VM#R5dCJFEeUbCTO=IWv?Q|IM z5Jh)zQ@G7wSIRx`75%NvtcXhB)CqLQojXiJ;A820ngo2RU-RG{P7mf(N{chb&n;972>W|_`7aB`qCO3jqN)p1$8!bdSb4)-~d+WC_(5^UO&1Q4TLtx^wj zsua9on3IQb$&44sQ7tjU5Y+0!tR`8g9EK*CXd(>G2w|l7s`$a_^E;^NP1-1qEL>4; z%P3kgdJzAI_>k-UKYpiC^!h*Ud?3!=SvBV)TKCqBiO{P9z}*eB2JHbsK|SQu9~g8G z4nv|%E>}cSE7vYw*l&sQnEYS0T;jj@L9I)b1vQr`v)s-LFk|I_e+eYPb`3`Zv>pXc zt%3#=I2kHrTc;;D*ld!=gQ28|OvKUV1NddWX1=Loa5TNPe|d3w>WYcYOMYE^^t0kE zhsEEy{+H;Ejc++}hYcNZZsyoiFHAjhWZh@Xj)^x&s}SgdN3-|fjsE_|BB$D)dh!1L zp62k7Va{-cr*4?jvrBf234b>KMN8~3-|XwhW@$3_;^tzY=mmHMNf2n(M3sHYJ4!o1r5nlp@g##Zjmzqi~{A)cYJ;zb(!1OI%-7{pR z4GmfqbSvPKpSPW8e@XoO8BuZMnamNHPmCW`$z)XkIyw%rk`vuQ;?HvhPF^nAZyZdP zpbP~q;J$FJ=+9q>a%qLVR5)>04IaY=y_*QVGZG7lAtt-lKgtVY$08?Dcm)?Zy}Ead zDK;K$PQeTh=N@f1n|cxr?&*eg3#L_w2-q2SasJ_o7uH@`_~UaQ|4GYUoc*bC_G9Bm zjGmU=Bd>J+;bF4#j@EH?XZkfF~6&9YJU32N3&g?_dGMl<_M0_kP|)ewR`Z3WGb!0snVj>V*}rZ z2?OT~b9dyl8s`q$b7vQo%Q%a0N8KctElnfmgm4J!<;3@(z=IueR7M8D__oGFd{>#F5E+e?EtGvO`$Z`UR8#vfvs_{b|)#Q9gRKEOesT}9+_3PFWTpb`@>eIgqMihNAtYFrB# z2KqV#4TF9awT)s9aIvlP27ePhdjtuy8#EBY!>R&o+e0IS1v{K!ZdE|Y?p{|gPsPkY z^6=97Lay+JV5*yXsNijw_V`mnYvX4%m3?!0&-+P_F0&8mr586%ADdP*y(9cFt_v~d(i-Syf8a1rXedSjL&*S{A62xMt;V|wJnriXA{eM4>6@J z`grQ4FOG;iKK)(%xmTapOJAn_&ru`Y|4;Gotw}FChvZOiHV1N@wcxW>$c})OfO6~_ zH7{sro>QX{6ue%5Ad+?b-UtRC&fFN!McoX$g9$+8E0DAX#$pJYZRH_aZAiXTt%ccEtM%4sj6jt4_Rn*A zLwIv<%70+C#fe3la0RoO8gO#4Sop3_pBq1HTR(oT_`dj?>lRHoxMtqGovrWgpHqAA zMcIKZo7bK+$pagv-?$C2@S7E*mUm>$p0pY4d_JrLZ0OOzOBhI=(;%o7c}_UJ7cq53 zNj4p*5n^06qp&4d1iyUAhl`f4Z9aD9tSEl-0WJG-!HF4G zQ$3Z_!#83E-bs#Nb_ddsMT0avU@ixma($jt&dUsWPFYvq!MK>W1ZkTHm4Y+qs4V)F z*w7&kf+4q(deg{`tE)eKs%cr(yL(?9jb%=j=j3>*%5%~#qW8lawydFSwTuTpvEu?w;NufTGL&AkiIzf+04eb; zQC#Y#(Tct4Y1c3saydu!5`Ia9%!0b3q!UGkuuq~W45L^2i;)c5QkPp7(?AzJG1};v z2hoO1tp@q11z7;dr%NXit1Q|uLvJi5w@#Q!z;Q?+t<7NOe&ej0>uxL(UE((%(P~Wl z2o;Zt#oS)N>IG2(_(ISFO#5hRaeevF$OINNLDU9|$E9ONm*hP%zXuJcapJ{({}hXZ zTt4$^WaID5`ty1>{?x=`*Qz;=_w46hbzr(KRmM^8SqMZ0wREk&dn=CG|=M&*2_*X>O|RryE&c2 z{glE7o-&XCyV_G};I&l8s{}2R850`jHQ3XzI34Ft{r^01w?&v%B7W)e0FrM=a*#86TAYJDl^RG~DZ3Pe z%LZyufWHD7)S9RV9epnD6rYm|rqCutK7l#}b>e!e7m7`v>~uk#efL}*4dh^9!l8d? z1)KDOOaY8mPwzaZry%%tOA5G0YnK(0@GcX?Rh6vuw7BDXClS9mP0POSr2eiC=Dk~0 zJ8#~ZnTz?I;tg@g*EA9wga>`|rg%O0pm^+!mbJU-;M31MEBOjx8}v;9f`{>?2LGg1 zYrORua8VlY&&*Xyv-j`% zhxoG#eBmYRBRFl=M=fNo%yz9z;jIHt47o!Ecw_||b&!^V)g$rOp2prPSjz4{cKFYa zL~;Gz!2j6iQ=)mCIG1Mq5B=T+{Z>fTUUeMk*U6!2VIm`$21Ahq_NtTMU8Dwo|lfY4lAN{U5MdMEB z-kiV6bOLf|1>!C7x35lQrSi{qOwO_HUEj*DVKfebpPmIYyomOImmK_z9EKkY9RNQ% zGv*roeB}zxSYV>naw;9hE4($#*44*5@(A$Ir~j&Ur(pf64&Qki0cckgL~a| zhm*UaSsz~qtSNw130_470X~sY1<&RcCO61hgXkobpxG+=I34L)J6F6o_b1w)pU4$< z%yV7jV)>JwA!Q9KDfWfe_(b^Fm!F#yA zNZ@xwb^OLT&hkG~@@@yDq-p0>$P|KP!1H*&CgXTHg*+d4Z(s`~tgt{fZ@(Bx7tkv) zm&I$B#Ut`NAKuvo{ery_j;(@u%rJIktH8ME7uUrihX_aXP2u4|L?PT@L6=2GDBj%mSX&`#C~kpF~Pb!+r=izvEmmpC}$#3D-M>EBrRO z8FZrBD_;bySk8}HU|=Vh{fzv!Lzzp%s4Z-ma3%evbl=s_GT&JW-eLo+0rkWLnHhtp zPNUW+0yCWoEiq&|iJ!(7REiNTx@zE6b}s{NwA!q^1s21RT`LA$3DdPLFRl7vWko}z zGU>aUH@tA00XAkwcbnG;p^tPk0@$TlP7k{t2(UduQ)laiaN*FKUz)L0U zKfn|~qV0Yvol2*GL8@$o@e?yRDq2}k9h3G{Va|}DPv#0$pBz0ZKL5d%M!Ao8{lJ`Y zS${14c4=XG{XgckgVsPs{BIy5%t|V}P&htJIMM_LA(SK&DO1B@ICnw-7Ebie*~@FF z_bUgQ%MvS7M=Z}DRg||lz18RPsgLNWH?wXSLl=F%sJtT9a%-4d8+Skge&D?$?LMA9 zM4=&yV5Ded6!qQJ!TR4to27<8AK?AWV1KZvvvt=AQ%U0w4aIX4l$_jN z&8Z9Wa)*Fod_F#YicUC_Q`%$t2s-g!KQ%pE@cZ(wYYNLjIqh9`0+}VSEi;S8d1Ee2 z;8ZQ=c@M3Yv#LXD008+cs5I3?JK3{N?)>=!kt=o_XV(ug|E-5q-ZJ z$wqp(=)+%?hk&96$5OGR* zOkTcajrflE*$3Y*Z_aT}95VRsC&Pz}Bd1I|v94{%y}Jx=^HyTb5d;F)1_y=H{RXgJuGaX63H1akwSwE|^4JDSS?7QKo){`hM1b_yhse=6%1I#=g*-oB# zX~0LM0738t_Y*BFuAr%7AI{DzDO;x%Km3`-$i_eH96X@#k-J7=3?LG3i#{BTd6*mh zNTA(Y~(Tjf5koT$8sZf$VS0R=X5!7RZ9A}w2KvGgq5L!HSlfqh1>JbXA$j9zA6 zeGdYzRZg^_8h9vPip-cbGM?g%_tgbU9x1m4p~C$$D=3uDyBaM|J3M(=qp?=}uwFZ^ zY)$WSrrdFoa)18DSKcgCeLem0ovnG5t{PPD_4mctdwLeeT==@nrhq>`W>emtIvv=Q zPOH}Zf7q0PG4MAAg)}dAw^)+|s?I(X)aCrXJ>JP=&_x*VC63svO z6XdCmfLEvlYHVf$zpmA2f>e41anEQtySaT78!|~Sw{@GyM>hEOXClAOYZs z&HR2O%stmAy)@b&CCoNTEy3C5zTd>T7Uvo!0{3JCYiP`cKRDO;(WNEJ@*w~iSvvp% z09dPj7~5}vGV7T^_J!Fv*<|~SJ+O#{0lCh`e;xSmUk;DS`+enSbvW6uNC2&r-wC{F z2t@r}DjCtLd_9?Qro`(cqvY8%3sOPl^Et`ksWG2OpZxm zJF{dAa56)dNBlwR293_{>Eo@_`D8eC8X3uS%I-14Dk%c}wQSoq9y72Yc^jLqtXK*H zcFA!=DrP*pwn1Ih+Vj+s6LB;sUi_v?{<-Cggr}Fp59Wee96#N>;kprQ%mKPHAiCNM zZqE-g>RuY1ifC|b`FSx$_*3E&L#!{&IISr+oG>aMJl4^l2;h306@aa>5Iq0@Wy`na;hW114aGU~2_4o&NhNJo&P9`3NrXE+_6c z{OVOcAr5F=gz)4H(7M0Q%5cgwxX#LOvgtw!+V0QVuo#6J04S~aspE!)OA)KA+|6j$ zyY%3G?)dlbxP}AH+px+SFFOEx&_Q-J#~TbGYPE_F4v`i^5TD{o(9q8U(WuP;)4o*! z^FIXWxbdt|V4UoWe${46JbN+b$p*hc5wGuY#FZ9lQe(ayF#fP&%xF&cLLy845FasLz1S8mT_R z3bhhvu3nXU-!`K*VMX-?@EyVUR(S*k>BA#{dp+>2!^Ehxf;IX2Adgm9OaRw%izNXZ z9`wVOzy_lYd~k%tMhSHQdyIMC!QpT0i5Xp@Nex&zV}~YOo}C>fJ8-*y+TnEFiW`m! z@#~!{zvPEx)2JEKy*;ekqSN;U`zH4Kg4y~sE>Z~R7r-7vFNm+zdOd7u$f-siB2STz zl`oVx%3qZ$7?Iz2qgpU(u0?3lb+hYo9XGKBlkr$w8CWCy%di z=5d=+ZQoAo5f;>A(7B@*&TQ8aNTcB{mzPvJ2SW{4*srm*9BK02QHpuqF-Y&iubV>r)rRf~bMcUO8q9~E56 zk+{101>d%sk60d`T9#0mTDz^ZICpXSvMoOU752`C<23E8al;00>o>+w@yp}o<*>TS zglLO){sE)-3Sbuu$KupepA&i0)IN>nY3&~jU zH{fER2oF3>B42rO_pFBU+;X2-8XY5E(m%AFYqWKQ#GUHvcP!>uT-0x}^CQ1Y8#emJ zr;d}kV#lq%pHzPO&$lnYdasIzf<@Q~E0joBRhf(iZ6K%ikSP_uz99-tcu06k_}K7; z;je~Y2>&Hq8P3-Ir{i^)voZ9uMcRy@e51|C)(Z-wg4J?GDk5zWHY|!^#u+L1=`)!gVOo}{V8r;5!FH2eZ_pPz2~T;AfqL);jmlf&UF=k7G-~QA zSF>skww6KR`D;&s;Q-S~Zc&1BghduxXen43Bh)TJ7QxJw(<*8c<>w+hdUS+$#EREq z;iG3qK=5g8wA!F?V zNE!Dzq~JiRlQXh3!`iV^AL{?Zsa?B@Tb9CZ{%^-4`gL4=Z^^D#9vPK7X3ioy-a7c< z@o@>@-i5ikfA1tB-0*`Wy*T3ex`nrewF^Z{#U(1uMd)g zPBrQf^+I){dZYRmb*EaPR$Ht=LbL_4$>=OuZ5k_&!wG5ftNQK@UL- zgwbJ~%||a-38UuchAt#=iU~# zzJEd7e6nE+?YU(;4SeAR@y52T;#Zsb-O*?GmGtMwUvy;c9w2_to;fXUJbOmm z`rZXvdU~t)&DL!+V9OR7u#{~n**N4uU^jKNj_$LO+BilB#DY?S9n1Y0o>3j*5OU zBPSL=^YY^L!mWqr1PkWIn&(0Sj%5uR5N_SnKdD!*)U{PpRRyy3re5u>FlzjQy!lM0x1XwO z!Nn#?CO(|4*#?$-y~S#BSgH(mEq0{zEp3V!2Wzeydik6+)_fniGALdAfR3awOSQCY z;E+p~=%u@x+fPOINNpAm%X3`w*{%<15j%vvm~S#1R4Tn?lxL;NU;yA(fFv7j7FG|! zN@=ZTVejT`FAR2k^4{g2xH7RrUihzesD!?A7eZT(!04~xqTro~1+bf%|zJ#T1^|Kjnl*wy~xJEX7KM(;NR8YnY{Mv1uqqPc2+sQyjw1MHeTpUH0}LExLWvXT1C*W*!O25^Ve}^y2CE$opPg zV6K}|nK$$18rd+}3|XV>RoMk7Ra3B1H8%2?JO4LtPGJX`hwVz~L$HZ6-l9fu=VE|3 z{U|jucWxBpo}~qJ%p}pOzkdoEseqL+tD24^?{ja19wNw-*9ldS5BZ+1gT!MWY#hU8 zTtWiV9&5|$ARKMU@5wUwS!>?LfM4O>Dzm3%3TKETRD_zs^R@};hWpy}E0B8$g9 zjw&RqnA4iaLn;z1JOb-o0wH$w-~$6SVOSfd@z8{_fqH){02IJhf9{N$&4|_qz7IlZ zo2~nrg4^b8sG9j?Iu^)XyAB0%)9XfOXqB`aOAeiEnNcu#ZQk&aw#TIcx#HR?=V0ex zGp%AvkCBh&baqO$VTvjaYWHA3C`c*^p~XbGkJHH_NOXeKLZIi660 zI)nr*)1g%9rkDXb)IeQImOWDC1w{lZsD@IhsN4Ws>MDcEK;<&Mhh8ekqEP5@zcz}M zKY$6s+$2{7YSQ?;NK+93AO+f}h-ELliChd_}8#IiT; zsEtC<3V{+hyIta?RvJU&)OK+!xx(@_X|PLsM$;^6=}02Fuoxot&OFECL@h7L{dN4BGXGXP5YmE zv~AuvR@HQ1{^WIYM!DX9`u)e0oFjd=%(X9h%v0~pa@RLyF0Wcwe-$g7@@nQZ)j1D} zN8d7~bH7E47YkiI!uQfa%+|3|1$AX}>naVUNV|N+zqOb{^-_y_+WaeyV`Qt;BB)Cf zQVXUDiOOWM16nX!?jdy79zGyX z4=4?Bm%m8fg6*hvRb;^?t~)%pScJLa%i<>^2TLV*@s{6iyT;pAY(JU9NB%DUL%b?G zaO08~Svz+>Fd%k-ckqE7+5x1u-9N%3kT*t=DA<=JdSixD@7FgW)7iKCUMLJd+zyjU zW^pqeH$l5%36^$)EEn4kbyq4grn~M!elCnJ_~6#K>g+zflcwhW^W!(BFIqfdOhWOP zjM6!&`NKw(KM^2CfAC5vZ1UEIi?P&O9 ztl4RfCsV@d_0`DVmwmqwHpRYQ z;3(tXz)AzuEmRdi%?C&>U7FD-6f3zUnucrArC*AMQiTQV(<#&7j*w1*s z*MrY9ol5v8UzaqNa8IW&lW{{4!<#s|Q^n_jL*+gy>%svo_`+^2=5*Sn7V54R5E1bb z7ZQ$RBCx@5sJdD(95z@vMi8mRWbq%+g83Pv#0hwjEXbwR$|J!y_a-)ba4_isnM--k zp7KDApI=0V6IO2=tYI`E8BUFRTMM$6?t*;CYv3S+$U| zr%df6>;5G+o%!_r7pb;&aLT2MnwAdpjMvBKkD9W7YSAdBQRu0#OU_1FA!_sl)VF~o zOkI*-quhbgERr<79W@rz{eES)`*R>w`d2S7qTBsrFb3iN1NavqeF^^wC_{$(4_K4~ zH6h)f>>k50Zawg@>c0l7{xdL|S(d?S4-436paw6ZC{&ayW-1`npn(_SQz#!xH`2H0 z=a8_Fv4q7eNI=BHf9X9M+5O~Ugs$5;yj$a1my?>Boik)eZcggZEcOX6n_m4TFSj5& zqqu+D+Fgag?rnZY@eG=F8Ep% z&e)hDL{oqnTkh*iBY1f0I)VE62@bZ&K7Zo0hPhd6qrIj)qsfsfrWP$sr_(IE9@`+c zdB$;v*q(dB(nnWMUBmX>`*CtH+66z%KKGtFdbt0;I9P(5q!+r7wf-VzIU{{U|=7O zN$qJ>*7#;Vo;@@x{fS&Cg}Zd}jJW#97FIK$B;xs+H9P-U{0n%<#XnbG#T)Ss@oYq&S^TH4J~ZH!1F|Xk_s=Lj)vk+3t}%!=)Vk za93IP%5**|K_qEi?}T(Dlw_P3JcSjv``oMSHcIb_Xifa;NU5})**Kdsufm*ZA$>^_ z$+bs8DZ5ucf0!`)!GzhbAMw(~<-kPg6$X2`T6r|o*7%X0Fllxf|G)F^E7yQcvDTg@`w@ukE5=6jAk!tIN-Lnt%N!c;~jcfH(zV~8f+n-oOch1U9WJPqN z54$QeXQpRoPg|M8Eh~98Am-U!KKW^B`9Hk#3C-TWX;ZhVx<0-5rg`5zJ!%~FdbfN+ z&*vY9;ycKK*&qv64p}g7*ni+X7sPl^ zv0r7pa3!Itq%a_9e`?~MEW&X7^e@R1_7O@{cUcbYAU1}+C4_|gf#Z~zay4`t8)<8J`~{*oy-jbFigQjst&fg2$J zv3n8CYecb#R{;gLswJMx(g&BsNL7q;g?HoeEAeI*ryS!{&>}8xz~w0{@@Cvx1K($Q zmiRT}$9=xJs|=Yjc0pGM09(Rrng?DH-dE*Q@iz^a4Ki%($6?S0-M?%A$ao99OANno zfW6|bd5qukg@61!clV6fL@{YTO=VK7q`SETLKLilbaoF_3hdBqgk40K7Mbj&l)RKw zt{m~~DK6eD_wgqefCKin$Tjf75hTanOCHoCsMyJCdW7_VR9+9G-P6zLSL{?8jRup6 z40DLfh zPs<|3R!?sl9WH+7oK(B^>G#Cc*6@WMUJD|ZK1?$|9KT`Yf`?0lOKa-eLyPu4F+W8V zQ|O<2hxTpnph10-K9B1Oy_m+0$Gt5c-ZFw3%l{DVNO2CtGc0<6nG7n2WwT*j8Ueaw zS*u*`TNdNv^_p(i3)poS8L_Yr5(96WLT;K>O2D?AhejKs<+NG_Z}L(EvvemaUfS1! zVs!YS9!TTEFBsTZ*^6?n>84p+5kjw0VcuNvxdDD&17G95ShsFB7vnnrZH`agMW`SK zu9PuAy+0WUYk&-Uq&*|sX(t1GExxR>Iao_P9!d;I%y1@0s`&s-yo}X2$3WoMRk>+I zjX=gv+JDEgSa$_06tDcH-kJTl0`AZSbZ)#o3qhWmjG(&cZ+u-(IlxOd3Lj1^H*i4}P;a$>qnD=5U zH*AM_uFD`A1%Y>Br979cD_aIF_;cM_%;|hXYN77l;-zjaj&){BEmYlGti$}hL}hYk z5wyUSu#|BF-@rWir=*_vLBuZuPoX8Tg#9>-f;|H~znDiE>?`=OtuT3pd=1q2m_e|kiC4Dp!fvBTqARiNq-)eEZcJe8gUJjZ#y>YY*R*Siwx4#Y_B9=^>#dumdqwvplz!yt=jvb4 zUxq4rt6_oRF#P+@C)Q`K&wIW;zI}aH`o88D=QqXg6~FiVJ~HMTD~%hC@A?z}9RKnD zTm8@Ze-uCh%mMiUs{?ihycKXMFg!3ZFf*_uaB|@Mz?Fel1HTQt9pn)d7}PuH@t~za ztwApZy&iNf=vog&kI_A*_gL6tRgcX*_VxIo=g6KDdp_Q?uIJjG+j|}gP75v!E)Sj= zyePOScysW+;8VdLha`n$hd4tfhs+CE9?}+a-4t(1H5Hr2nW{`Rri-R8O@Eq;&F9Vk z2sMX}46O`(GPF5#XXx?JZ!O-I1j`7^T+0^Ap|GH^#IV$`g0SjvUHGa9F2WD;i~S?A zBVdJt+M@w&FRc7w%vjC9KZ%DDE)sI~k?dgn{4VE%yEj}rR3*v=(6t9>AOD2&?6>S7 zw*bSIV@D1N;5U)8vS<<|R1&NF3aOIqBx#(AoaGLX9PU8pG@*>_f_u}rq|P?3g+y^# z@XVObZE!6Wjsrqv=LPumhR<)|GYF0nI11pf!7-Ax=dxf04mi3FeizvWw8~`i&RXFX zNf2(3`LZeSITDT(k|3*v?`O@o4ZygI+?xSE z(=t(BKo$roozDr8omKqS&WqgT&f7vIJp-T5vHnYP?*zG#tst{M;Ij%2kQqJ0e?@$N zw+8tRvH-%qR$(FR@3Ln=?(CXCI`8n)*mGnWuO!KEltKHigfBXe$Oe%XkaZ2++8GDe ztGVCEW_X?`)TF|F)bhKa9mxFe4n-8`0`!17V0v&LpqKD2xii^!KY)*F_&%P=zWaf) zXFAG&9e*aa2AouQvBzKf~7&{j>fDF3i⪼HU^cazM5FAP{JRd2J?aQP z84g7PnXmAMXJ^2QaRaROX3%8*GKo^`hPBWk*gri46$D`4{9IUR%!L)g9kBJUNF~<_ zv2ZIJZZ3EW5XZ7 z4~6`MsnaD75q-!KWdm1YB6K6WCyaqPiVzcwdd9Zo=hd*~bqKyc1lI+K6thS+d77Lf z7f2_KgCC?j&HXp`smaF_XbLukng*ECOtVe9LiI44F-+MchioG6kq@A4vAeCogvvXzVqpmxyZ(ZM9Z@>P^^hL^#y# znM3@2bXtwKm#4}DGQTnb0!Gr?)K1IO+xc*lE~CPdZmGzM>1|5)uS|>Soo>k}Z#Pw# z+TlZpuw=m(BjBT=+vW0hJG7kmmzH*^rTtz@sx=KH0~ra6sr`JK#dL_4 z7L~wxLz=~DYX2F}^YL7Wz%O3##cYNrkSoTmDZM@8@yh!2a^R8f@l*}944t5g=}q>i zJmJ(6&f0rfX6~WA22(uYdZiE8!x5zyBMUuEuNdE6SX7dp7GyR%V|r(|ds_e#+#*8} zWxIT6y8=;~CPS~<$qLh+-pA@!9@3I=<30 zp8VP$WHh0@wf=#J&*pP(Pzu2i_M$iuaN5_Yql z8`@5bOU&#qC83JZYUa6($0lvm?|qk81O&EV(uSg*4=9Z2>$*y0kME^K*DA-6T^x_ zb}|mWv@a?uk-nSAxS+kn9vkg!=gQfgV_kQAN3c7Ky6)V2yxao1%^hA+-!6n_kGG_Q z#8*_bFB%8dHH9h0qHXuS6=b&5>vg82Sl|)bnt$+SpW^glWs{bcmIF9(jO?AK+svyk|8)s+U;o|F?)sENYeN8jfE#F z%0Xe1nO=)Z+G8y<+kGslk`=)P##Z{|;U)NpbTz%*XJ|Y860rNJ_SkfI7EC|Ao>|)e zR+WoDmDMYql>>mTrKsdE{PgSfJ^f5U`>gQVsxu8RwfhYPi;PIGFBw0vJ)}HnJdDwa zrjj6YyWI)a;Ix!Xa557GX+~WK*5D6B0Cwdl$sKOVEh;Sm3otwJ4!gn73E}B~L1QTi zlF)#$wkyMxrV=iQcS1ugTrg$8i6wO)z;;Er5)LgW2d^?CPaS9~p+TgpHL%ehWlEor z=5EKnKY$dz@Zm$Vy0FRFSHLqgE65D)0RLiob8y?_CJc`&nF6xdJ$4IR8r)WbEe~ba zB)R*u0b(k#Ot3gDm8N!kVF?ov6Ax;{EezC;q`_QAN%wEvgau+EX1I-#a|^RQBl?~U znQ+@P@q3r7!M+~6o!xcYRIjw;4zFjLu(%Nt;5@sXFmt!}*Fm?zOE8PEfS)#LVff?V zuis<0vw_cy!&Gm{9$#-6UNR6{gYQ`o^dzILC%H7&ks8w*++gY+3td*U$4-|GFD*F? z<-w+9j*`6`<%X80I`@RZy^_NwLhN{zV^`Tl*2KiVFigepMTzZ$4%-P?gm(qJfZrcE zL|pm^(cv*{7ynG-wYz1w6v#Lv+y|4||Z*ViB~kJ0*@sz=xakh|-dM zY66cT1VX9o56s2C5=I8hP3flb%ut?kR@Rq0*KO!WH9}&!Vh7{)cg$&CdA5xGvJ|v=_c0{-}Y(#*eGejYDhRET5eqM0M z_&l1I;T2-A>PJ8g=?K9JkMmRmzfb!r{H|Ya#<`5E8N9_BI$~HT?O_cX;b-+7p`)4+ zTB~NntC|ZMuCIndP%wg8$%q+H67(whg$P+OMc84OoGXm9P z2Z(RS>dqg<8J*vXZ*_i8dWc85J^X)hDy<*M4RQ<0Yop1B5<+VIjgIyk3mw!|~jK=OYk4jIbJMEk;;_a0$X%gmnnpknZz{VFOa%h;S3a z7Z7enxCP->Z22O>Z3wp`+=1{_gzX6TAl!>^AHvrV9zfm>B0PlfFv7Rst_tO&Liwmr zJ}Q)tiZJ=8P(CV@j|%0ZB1}Fi!sMeu`KSn!kBTt)s0fpfiZJ=82$PSBF!`tmlaGop z`KSn!kBTt)s0fpfiZJ=82$PSBF!`tmlaGop`KSn!kBTt)s0fpfiZJ=82$PQr-j-u6 znS506>yr#J`KSn!kBTt)s0fpfiZJ=82$PSBF!`tmlaGop`KSn!kBTt)s0fpfiZJAT*hr4(Yy&iZ5k1-LfC|`8DR^;H3-)t zhII&A5w1trhIo!b8!btM{_2nu9de>0j1wp%LdZDLAtyTIM2DQ{2;)RY7$-WyIMETt ziHpD^HuwP{4S3Skq%W`r#W*C1qc!+?)k}#fof!)prKc@ldMFB+yL*a-* zx>1NT3UNju&M3qgg*c-SXB1##PrVB;1|<-K5{N+w#Grm-Py#V1ff$rP3`!sdB@lxW zh(QU&palAW<&=>=U^xsjsrEsfeGq3K#MuXA!mh(_Bm?Y^=Sc{YK~{Z`VjrZ~2PyVJ zihYn`AEej^DfR(NW*F8XY(=;pVH@IM8tDTT#W*<&Fb=g7huVolDaE07;!rzrsGT^} zP8@0{4z&}9l8i%1#-SwRP?B*d$vBi`9BL;HwG)Thi6CGw z!mZfyMTFZBZb!HS;j0MS5$-{_7vVmHuOU2uy*r5T5W>R=;Sz+k2<<{)0O}AjztJD`yBlBx zwCoT1WiSq*72!~PDji`4!c2tOcy}1WLWD(ly%^7jkux(mW>EkA#6g}jIaga8idayl?@0tBHV=V1%#UsZb7&e;fn~jA>58|2f|kowjBBDRNn=dgmO+oIVa&bNP7-Vuzf|!j#Cg&uG*%)MUPJ)%tPPWM5{!s8sMC&sD+ACk4M4v%0R7Sc^Z*0U0}Mb9FaSNk0Q3L@&;txW z4=@1duVnOo$>{fzQD4cRuUd$e8UAF%pN#mE5q~o1s|~KFBg{aUi7*@6v-L$X#?Q&1 zFV>R9&&i-KcFyAGWYE`cfGmDahTkt|RH~8UVuUpammsV~Sci~#wq)#AGWIJO`<0CS zO2&RAW51F?YmC+ggc}iVLihs0%?P(3+=}o;gxe5qN4Nvws|ec>?m@U0;XZ_~A!Lzu zGDh0T7-=VCq@C=R?OWJ}`LSg5V*_y%48&0|5J$m490dc>CI_NT4n&(Ah&DM8ZE_&m zT4J6N6G7p>v zF#|hi&!)o~F$$mx;c0|t0cIl3OvIUqI5QDvCgRLQoSBF-6LDrD&P>Fa1vux!9*7Fz zX@qA1<{-`-#F>NbbFh6rdV_rQ2Knd>@^S3vQFU#}Sv0BQ76DTt1Gtd>m85kcVN&!!YDw81hhv*9-A_Azm-U>qU6I2(K5R9Ewm5 zMJR_NltU59p$O$rgwGb?v&Hx$Eyiby@!4X0wiur+#%CQM!(!q9 z88XOxrURwqKq)y;N)Ggy4wRJxW#vFwInaYS(1SV9gE`QHInaYS(1STpo(`0!1Lf&J zc{)&@4wR<@<>^3qI#8Ytl&1sb=|Fip$Z6#8EWnXyOC!;iM#A+dxWa6y1p88geJKI| zvm36kRZj`}pAy7Sf)QE?v4$%_>>c$a^h1?e9DPWIq|7dlu{{5 zsT8GDit;H%`IMr3O0n;y*!NQGdnxw46#HI^eJ{nnmtx;bvG1kW_fqV8DfWF7aySY( z9EBW?LJmhEhog|gQOMyaZ)JE6~Nr!(!xN zG4ik&d031*EJhv{BM*y_hsDUlV&q{l@~{|rSd2U@MjjR;4~vn9#mK{A8swn{d8k1iYLJH-(6s6ifTkcS%Np$2)VK^|(5hZ^Le26?DK9%_(> z8swn{d8k1iYLJH-Vd&A`i95LoM=9i#*gK4|T{x9r93za;QTd>X3&z zq}7PD8bO9Xkw&D|h_o7!RwL4CL|TnVs}X56BCSTG)rhoKA+1$N zYZcO3g|t>7tyM^C71COTv{oUlRY+?U(prVIRw1obNNW|+T7|S$A+1$Ns|jf}A+08) z)r7Q~kX94YYC>8~NUI5HH6g7gq}7D9nvhl#(rQ9lO-QQ=X*D6OW~9}Ow3?AtGtz2C zTFpqS8EG{mt!AXvjI^4ORx{FSMq15Cs~KrEBdunn)r_=SkX8%QYC&2pNUH^DwIHn) zq}777T98%?(rQ6kEl8^cX|*7&7NpgJv|5l>3({JHwALW4HArg>(prPG)*!7lNNWw! zT7$IKAgwh>YYoy`gS6Hltu;t%4bobJwALW4wLt4KSqronWNYfRfQLc0rd|tp7-Vbe zwSb2~wx(VS7+8C@re22_)**&k$KF z!NFTXo){s^3_v~@&zaY4L!Z-zKBokUMogbCf7hrR>2NbaST)GDou=-rO2NbY;T)GDouzXy)2NbY;T)GDo zuzXy)2NbY;T)GDo^sFJs0}Aqhf;^z0@it%=`8DnV1#0^dt7x9EqItp!^&HUnxLQ$9 zu22uI@p-}u_2AOy2`kit%l(o*PgpUZCp^F})FGr>)Cc(0aOqymtn{wf*jQ{VHWnL;jm5@dW3e@{HL*3Z zHL*3ZHL*3ZHL*3ZHL-QEb+L7^b+L7^b+L7^b+L7^b+HYx4Y3We4Y3We4Y3We4Y3We z4Y7&XL~J595u1oj#3o`Bv5DA3Y$`Stn~F`vreagEsn}F(DmE3n413U)VO_p0`5v;V zG@DAZsWh8Pv#B(jO0%gnn@Y2(G@DAZC9k0+uc5_Qw8YL0?hUo%HMHb4wD<*ilBGgN7VcJ-f=&^>4x5MmKezUd&dLpb{zGNSNRj9-to~~ z|Gn+7X&bjZ@sB&%t0>Q|m?KuOob5q#rOlwr*_4ghX3mW1%00*;XL;Y`5$IF@gLi$I zl)5PovwCyrf6zB5&k}q=WgX^Oi>I+t`jxVu{ZH=yF8f~YV}|>@h?N27*xmZu$em5| zf6Vrh_D0ez+9YSYck4A$LSI62HT7^gb2FpV&{pnx6IZim3;`$Rdzv1eu!$oEAbd*@ zK_6H36N@^)`oh(=h6wewJP9T~g_WG^coKUIt#>TXsgI)_kEfkZU`MAD*&Fd>*7cu4 z{hmhOIGyK}XV7kE(z?EP=2?`17YkB`Vann`W9Ktpe*yF87jlOevvTPY-hObYT}GRY zQ1UI5dK)uI9u0eyZRdWj;a+yI;{IBC;!b+O^~@0L!r#Ap z=GZ&7WVch#Pt&J9pibYl_w7gO>~s6XJ|!k)(tfpP>?`}izN9UFCJy6qyMva#leP6Z z+F_oyxr??c(i&yjaUbpXlig$Y*}cqWJwQKyg9WrwYZM^4#9%d3_V!Gcxo6 z-U>sM@j8zxq4m4}cuxQa{=Q5_o6s}-Z{^tcb;#s)&*Wj*$cKJ*xO-)8YH~Na?sXZ? u`PmGb486cV2eh-yN%Wiz)M!8LK1$vC=XPq@cf|Y*IZEC4p&<;$uJ{{({~qE1 diff --git a/www/bootstrap-3.3.1/css/fonts/OpenSansItalic.ttf b/www/bootstrap-3.3.1/css/fonts/OpenSansItalic.ttf deleted file mode 100644 index 7c79aaed1d98611bdc9f40521843869b9116a7e5..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 32808 zcmbq*30xFc()fGbJu@&2%moZLGmKm!B8-5D$^^Ml1Vm);LcGv;E8d7)UWiCT*5f%B8kjf^w>Y1K9YBcd6a`@g3-xcYj$0Xmm_U9e&{WyGI zJZf}Q%qt_e4kaZ2Gx%OIWzOXJA6GBzL&)es@cq)1C5!cL=XBnLj6Vb4_e`HZW6tWy z9csAWNr>$DjLD1U1AZgmTLbr1GiEQJ9=CYxFhXcQLPp5TrcIvuOZva25HiXg?#GqE z1(n{-1L!gOeahx6UbbS~u#s?o1R;Fci_;d)-S^%8uLzkio{)g1+4H7M{;ca#B_Sh= z0O#pBlb6ls%IO~X&iK>Mojhln&)irIAuAuk{n_*9Em}P5IwocOVB&$sL zD9LSsZpb)1LI6Fo*wQ}V^9be zA$~t6x>EdjR7&KaoaE?uNypPW)WrSpWc!Gs__&mb&MGZ1d8u3j*pf`Zp~+-Y!~gCRhTkA#`0lO7?;?2ss z<>FIU>NidN&Xq>4tgoQam30-=NzwT}jVcju@-^b2DlwlPW=9n*sHDfm5$vcG577dU zcShF+Axf$u0VJ68BZJL>feJo6sGpx}uvDs*DzYuUA=;2^i>DU8X+0z!Bq~aikPsE6 zHbtlj92%lah*5*4sJm1qGscI6#(H|1v>_p}1LNZ3O)^iNEF_fo^rUfdu>;{uD)n&p z)bWS!zaL!}eQ{a-JDH{R6`#EqS{J%|RnqdxiEWkQ(ic}J=Q+(@lA1{$?!D%D|E}BM z9pRDmQgqwG-RIQSqYCr7Bxf-rev`P@b=CN|0zH@IvbZ$X;sb&w?OhKgos#R&GbQvX zf($0XW{u$I#|KA8bG(%E3LGSpdw8StlbD5|=+R6lAH=vb#l&f12kP88DYKT?ff{By z)NyMV_nTXiGfyvW7ls*z&rF*2LRo5k(zJ%cxhtj}TDW*wr!je!`Ne?+Ng9Hr zW53EQ7)&Oo>X*fDR#TT52e!Q^ibtljH6NhS+Z(y@tN*q1(5SYn=?AvY7H!tjt$4i& zdXx-(3zXa-F2s|>k^yGlzI}Zps!%~0HXu?6jM4;>EK8tZQe;_7TKfpVQJ_oEfySVV zLC`xL>p=*OiHoOh9H=4~)Wmd!!^4e}(YSb%RHikCV(+>8GZ*LAmkk>uzB+dALh++D z^AqdD&yL@k@rSqC-g;qfa~}1q%xIt1as6ufvM)EZUz4OPo4agLdd~R4BP~x&$>Zpe z;icu7v#RcH`C|I3P5ZCzs>@kYn%`GkIrr^{R`KzHsfFhVWn+zggJaG4D96Ux4K@lK zBg{UypjEzjhWi#;xe)m=o|lJ`q$KbUDh&)>POZ`!x%?lf)5||UU0BmfRdh6Grdsi_ ztzEnzzA4(MoY1Zk@eKVDFvtOe6ED~?P!&gwM6KdY8v5fu#iu*z4-0Bq_!99A+k4_; zE|jaFV<;8>2^`$!W(ieNU*bkwj!C6%1dND@l@FE$Yh^qQrNQwMEnm2j9&i$u9zU=^ z6c^K2u|A$I3YYvMR%u?25~~K%tz!Ff>NjV{+q4OAR#GQHC+vY4*S669gBmlgf;m zcxrT7@N(7aobPqt{YV2o14{Aq7MH*+0y}a#0$86HaDezT-L~O17p)C4TR^q_QE_-ff{7G;lR0pZouzV!3^-VfQ+_2!>(y8+noms&DEPgI}J?(l--ROgVHGL~i{_N1H zuj!#jbU2|j3b?C7y{kF|8FiLYFJKVdSo8pcQLBju#}x`zG~&>uME@Ae(Oi1Ijc=xs z(%8XsE2$roivs4Sc5dT@gT?E{0Y(5j;-3f>ihk_e{16J$Lu}6tDz>a{?$J%o|3zxH22~+ z$1Vx$c7CpR*1c9ycYWcg{n4?zH`c6cJiKZA?6~A5O)#Z%F!vH+gybxYDlPN1Qms-( zC0fY{i?deC%cQ(r)=@ZLfI+jV!pNq#cxvKJhB%GZCP;$v;#F@svk>k-Dv9-dmG99}Rg8!ig;_rflWjt(lv@DsD*Q^x|2du~O(q z#50Y#NxTf|krsnN;)S}Bq27Mm0~}i%b5CeJXuKFDpyGm&Yf}u)u|mZBlVazg^|RK_ zzxKo|H|?A9`l+gKn~q-*E4OycnLT2SC47k>zaWkkKi?FzD~kHie%WK+Kl@Tw<2Pgf za%5F)!mJg=H7_yiVqW>8FcrMAC-a#~_fZz5s>eOseP(YLt!3`o9_;pb>pi*YlSjYs z%xm+njvQB(IUyGC<1E7PONp9zn4JZ)RIVIlk*m-kqI^E;nN)fq?w((!IPf~=8SWzo zT1u9a$AU`u9I)!l&Xki#qyi5H#6riI1PFNnD~+WdlnScOnfx}J2lw4$dZ3ivZ4(>B zQ>@>W^o*e6zk!EjL~~L?1S$y3DVj`C6X0=etiglAQOR%bEaSKH#r5@K>E_MMH$0>5 zYj%+cl=4K%@lrc=HH6(rUrUjJ<=g|Cj^EZflWw3HbWxjVC>4tt{asyO@jK8)LYQZh z!3wL7x=+9;OCL|QJkz2Ux_v*oUJbL2xVU&!zI_64%m6ZQaD1;RlnS2H7OlzcKcggX zOY+e1ALPGws%B3`k?tS4>HT7vl4xu7YvZOCO&vC2nklf#6w|(A<;Tm$EhrODvN<<% z0?fG_nb(yjZIm2`Nbm*H*Q^bRkU7VxyoL@HoK^5IA~1$6ST5OPb#S}(UbCrzIhRl) z^Dq$iF&1@Fsg8xc;BAO8NZ>qF#1IqjAvNkDF4FWd#0VOgh1q~K#b~u5(#E+TtaxAL zH1GJLn)Uy+>4l0Sa|%B_r!uRHJpNkz-TO3<%HO~H#Xa$|xXnh7QrGvWd$TQT;-2xz zFT67*Er~BUCjNQ& zZjtDfN`00^sdRO7(`8xQcvr71iz|?_PyEl#yLxr^%qtiTRO^^ujJ&}y|MDEQ9^SQR zrT9sg7)@hCf7yAuuJO|+RDR+@+op$-4$<0h!C$U_dF~(n3j*KGEvw6BJe~VW>*AHn zs<%S?F9&<{VqUS6QaTwL92{9y9GRHG%d(!Kgl*T=>I>#eckV@s0YEg*)dy z79V~}r`~^mTk1xM>4Lc7&O3J#+5-J(1m&2_ALcfsf_;G;B<>&wXPDQ4o>Y@%k@6C4 zmPOLtb)W~4n!!K~dO~CRz^Vx%3|`{?dvS&MMBD>|tB|_Wz|J?X(U^T7T{-%MpCdjM z=YIy>yw&M+lIGmLedp&Y2delyaOT)57r-MjGv==m>IHq(#|$ zjRzlVGtgM>uHJU7lvDcK9xdczB^@t`5!-El>xJ7HtVLm&;xFPC*J;@oe>6DiQB;qAekt8YoX) z>Dxbr_1hj4b6wnW|LmVaDWrZ-ZjwbPHy^XB6Q5~ua+1iUJY_1frx&neESCV$7UU3w zp|3UCW;Y+Cu?K6oEp_dj)s_o}*22vtR6H+MGRZ--t3K(>6A(WMvP&p>03Q?@4|WC1 zMib=@%p4$19Wk}Wo0<-a*GGw!-mUHx%OnS%q=CNH>BuMF zJE%$8ftr%_nRk)7{ie^azjh==w)g4G3fBrrWgVtNY8RXvF12s}uT5w8dhws)*atA`-KY~i{!sjI=QVNrpRU}!NN3-|TA-K4IuD;uG6>Nyodk&pNCX^H?v%{StdG1BubB4pjN8WIAwfIza{QP4(QMQe9?V zu6G})>{;*CDk6i`#VqXPuE%v}#7k;bukMR~e@Hc7NMh|B{eaH=;>z78Z*#q50Q1i= z(I-dT;pqPc=)Vi`fbp(%B5rPwVS%Ye&S`i>riG;{m<(7NuY2LegrHZeBy857sS!L) z2+^BWfeH`a!!Og~A@JZE`Q8G-fRwG4dsZ`{ESiQTg~QvhY1>m5!12xEw_USdN#A>P z@7bA++sdia?I~|eN>1LNx^`bs*38x!v9$fu2mV0^3%1qfEX^BpaPd3eh4kMV(yxAL z+{l!nMN^jpSEs?>9S4cX*vf%wWH9N1Eiy5{gzE)se&$4B>0qGW9-5=g;OB;m3% z7@e1qH)%aR=-r{y=-u}^|9O1x!O8CLH(lU&v!q<-#7hufP;wU*l2w4kpZN|!>BT$y zY2`e1wmUJ0?=bQqvEV+y-b`AZy9|akxDihe`-$-2V6>CeJ45Vuc-X-}PA;_!r)@_g zoT+p6AX?MGzrVgE|cH?bGsO`JHv8GO3% zoCoD0xdPmWK@ydMA`#Be7h z5SUZQ#eq)-ZrHpI?wBqTD`*9+3H(aD@RfK*`lR8B0rYYQoFdFu5T*6bGr?G+OF!T7 zd3TnHcFh9(ES_Na!A6O!8^6p%jqyNZ>3wScDuC9Bwc@G{$=!y3NdbE-7cOv;^RQxZ zJ1(I_fLt7;huKO47y=rxT;UulZ@wx`;MPcHm%3zh8KP!qLm%KW!y)|F?h8Mey(j~73n`R|$_)=G&O$ z(8xvTKTLJ3|GbME7>ct8@nafs^GNI2c6v@DI-Kpn=)hCpitAT8;VLhTm8<=74u~D~ zo=(%O6YF<2{S-3sgYwxkroA~+C_ekUrF8ng9^R}dyL9-Ebn1mp|97Zy+q}iEinm_< z%FY#k9D5(cVp2c1G>e}fk;%MK4w_za=!r?~;$RCu4|l;}lwop}Ef_#Ajv0$SJoWpw zpSQfULp&~CHwY`MlIo^RY#KP@!~n(D|IBp%)A=*ha;|Ra@f*1{t$hZx^fU7J&%CyD zL2Md~24B&guaO3V-S#zmDtw&%RbU}1;^Uug@lg^9aO7*BHkq8*yun5ogqN6&i`N>H zIQybh#;jH*Gs%pQ7%EF0WF9ag-}|fct{>_8@7oi$SRXNB=-3JV-rsxw<8PsRMR$(| z&sB?r!NZfMe(p|E{p&fg~3{RILR=F`I<~1Cs{(eMbJC* zvJewc@dyhsr&~f)VO+W;OzF`t-Qw{apRmk>{A!dM;>HNa@=_+VZz+aiu1d#JT7m&r z)wrb+k7+Gfeo>S#td2rq8EXIHNWw~m5#FDMKe!n0U!R;*eqx{arTE_$zHE9WXZpCL z+()N#M%c2d*L2*NUA=qR8tPe`J8DT%QGQPO3qr<=Uc*Y>`^qUcC*0S`&9ipRscWrk zXYPm#&rO{Yp|2Qy;TQKOKaDJ|Ts$npP366s*Nm|gv=-(U<~75JNd#{m4wmfC*3TLj zPsnb&czA+lJnbnTaK+$IU^3TY{?QR3yYW3k7_z$D=UX(bme;Ec)7oL=Y7EA3Uzdp| zr`9y;LT7QuCx&lXa(}lNDs|7_vHS4!m9v^^hn1Zd4d_Pz1WN9Lw{!#VtdMa^>H(9{ zCD>Xu8DZvsmc06^{qOC|&8DK^{lW$c8Psb~dU5=SXn0%{MR(30a42An4v~n5%IP`F zVz?X@#nvkz^k+!drN#{%ToFN?4v0VZd6^cNO@+hzg$zUkx*>e=)bowqvJu^sC`kZW z89-KUY=>Fu=FB#dloA;BAf#@$3nXBAz-0snJ7`&)+f^}whQ9ON_WXl1>tM#hNG^)= z79(x-oMNRoPwFmOZ4ay1ybRd6NWjkKGmfAfm=vh#emfn}4ma%DlCA^m?FU{*>#0;| zU6sV3@Cbzs*))rf7F33*bqGUIZQXifqlYaxv|!x!0oCn**~M=AlkwcCEt+B31-qAn zCjVaVDIfdh_ysFmoC+^YsjT;GI=IC>H7jq|(!dv)Qqyvl-F;aM7Ba3cEvsH!v3z}X z%3NCscf73cu?%AMuZ&d;mwQ>)Z@Bbu2bMnH;+~#kH!j9f z$+42kR$U{|2}>HW?9aQ9gB8>2D@IMTm7ov&LGTv}yH`m>%{;Qq3r2YNj0BS{^LCh4 zXFIwSw`jU2A+F}^mrXza?%bbRexWrLFV1;$QsvUJ0~3V8`|qC-k9Pd!(pfs{n7Ck3 z;}-E>uhcZQP)KugUAMriBnZXb^C3*oO1aY6_kS@TLM{qa3~E6a%rU>)%}VS*m=9aR z+lNEdSIIK0H;aEOE&Fp{_pVdmzK{don|c) z#!nk}=wBbwdy&@VvoF5&2U>Qa)Atk&`rXVGuZy?$LGcJ$1`iD(rtvkqy1^c!(!~QO z1czbR?Sk4jLwbyN7{~pPYU&d^aNO>telMbpW=xzRjCb4Wy6jf9C9G=Aq>sk{32pPG}9lajfqWaH~u8@waN zrVh$Y8d5j~xGC;>$bBJ6fjuD@wNJ&y+}^Gzji(wP@llm#aJf&FoBPrw$pu_-X3p20mA3t3 zBL@uu>I)!Rn|>vB1`i45 zmlVSydf4RCYCKG^BWhlQgQB zhIRx?IjP@VsyHf2x#EdAJD0p`YX<6vi&|H#y3Cc^4!2K??ORBlxgzAFs{{JN_<(i4 z*;z_BnV@vx>`d6>Y*>2%b)cp-(oe+$7wH#|4j!gi7sQ0lc6wCI;bJ+hIF;_SePjC+ zBBDeXkxVvTYz~nqriXR9^ts4ZH@b%+LEuG!yK#A(a~m3IdH;tQJFTwd-aQ3 zH8E~^Q~V?yGnWjQ@I^{QV^d+7czS=u=8Um4xx7Ln?fZIS#;q5EVxt>CmW#Mt!NeCp z+@k4F66qQR>{-Bumd}kCR$2xEi)FI{#F8*7*%k~eph80E__(T=(&p5~h33gI@l~d& zO&O~*vWvN^sROso@elU(OOD?<*Pz#Xv3cpSSWh1d6G1XcW^a(m;DcnYqu8>jJ7dQr z1yc|UilFa|2o>g7Kc-H3Y5ijJUKkL^9eR3K5;0=@z_|1YCgA!$c$09*Mg@>Cvj-QT zaCU~x(f}w%2yhO7kVr;hr<4^`L`7k2%p!UT)Pk{PS5Fm~V-0HWmyAoRh^TF>{A;su zW$@C{s5x_C`Bl3FmR~FPx!(@@7^-82UGX^B?i{vxAX|l1w1oLJ4ucXG+VucN=MKqL zSVcseymlsqUO4!b`R;f{ruxMCW2BxGiFXv^iK44J*ZnVqT#(@kh6F%aB zK`4vRYWS>E+ml;rZ^fk2g+5|KlxI;ccgxV3?t3FP>I0vvBeEq|3+qPxLp)viMd^l! z9S!~ed8d+2q?1ABq@5aIuX7#n6iWJ-wGz%pr&TGOon#s>54jNN5iA2GUyAuCM)gq) zCZ4qe<3rS+s$^GvX+*z=}p|H<)wJDs<^6bf&C^ltSnhNqmi{?`5OYYngZ-D!J2re*&ugQ zx{b8Rlv0frN+x)s^-yX9wVYC`)GDZlRKW^1U`&HDC%`fw#=b;zEP22?;j9Gn5-Z_g z|G>d>Y4p2yY~OwBC*C&DaDVahgdKy#JN`7t0Py~`eV9%X>-N-%KT|n;@EqZKjbItk zndLk$69lN@kg=f*<&f~-KA>Ui5(hOK)}6nIuATqQB%avy3;&JOAEM$xut(?ZZQ>%8 zk#Pe|q0#_ZK%aC=fQL+xZUKA_cgN}!?bRnBdaz3-dRa)%To0q5dokBLC;(T?VgW2e zIQ;$6kFD?4#%@_Meffx0Q%eV~n78oj53NfFy)vS1^R($3=hK4xS<|-UPMX4VS7)Ww zRqjezIV3MNI(1OLQB%#64-86Qvi*&rTY~yo#tg{sKeV3a`K(M!n`rL0I%UW>!qKY| zH~xX-Q^>Y^Kn<)L5BcUOd%@|m#S2vHb?@xctAqOIB!(KJ=NHc-wkd{Nr1K@$inK;>&M}pT2pRhFcwvfejqw-Fb!N3dEBE%)`T$l}xK3LVyoM z5D27+qbVmFouTq@2~I^1a}2&C!p@xL=FSKyCN1UlOSdGpA{VpLk2Rh zM&Jad5!m*@?ce(UQPq6Mq%mK$eY~LZn|&{f#p5qdnqJI(@jocrDQC4&tfVF49)A96 z@td|0teBmAC3P2c((Pd9&*feDA3Glzc&*gE7W8zRpU9`d2v9)ur8uUNdqNF}32Ps5 z_H#^sye88QPp@d$N1i-B*imTGQ)noY8MtQK$2#h?Xl&T9#NwHW6>W1W zW;WlU^<37hucuBK8x?ELEuOYu;*?h^-U0b7g?i8*fkF@)JwYm!S}pbR4|IVn^)rJ2 z&aqU>5s^YY+OrzMZptz)I5nqZZ^i72g*T2Cdrq3XI5lzl#P~V87q0nOP^hP;*0v6+ z%s9B=#r*UkLsKRc&7X8U4)n*lLr(lOP;&123Os)Ahz{kYdnoYDbp$C9-h8R4g%`#r47zr!1%9MHc<3}D{r>n&}unQ z6Et(*gL*H;gyW_2P0lX5jQupXeT#<5TbJB>ng03dsT<47N^+peTsqK}IUeM7MeGzh zAm&sOAIJqcIk`!w8|;6%kthhM+31O4D@!&YjB0c=syLHD=va7b(XfKguK($8T%_13 zt@u|Blo~&IN(GU?m_5j4)4hB#>{O^pC07PLEEL_zr!aoiV6RTRN(uJ*A;gAS7N_B= zfUQ?qW&Njn>%t>L0uJX4nKo-^jrg#1iStzH-2M?x9m_)qh5Csst`X*ZIa`rQc|ADE zq$FJXLhJ|Yd=PRd=e^|gy7}G)@0evK*oxZ1xy@MN9WkmHV;bI_djQ^*<=9-0Yk5~W zcvT2um|(lzC=C2i$20-%lzVVw`+{`^+oqJS{%Lyoh}4PY!o~M~*j!Qm{@k^JZ*3kk z=19{4hFM1z@nt;QXK^KgW>*5+bgpuT@5IsB%X3mFtLEdi!S)ZnOkA2n!w)TZAeM_w zh16%)g3swU;^urhoUV%zUvLxWrO`548Y9jH*+S8bBp)OYN6isRa=_fN>K z+%jQ0RF4f9_}Y$DpDZn%GnKN6?Sbi&OwbE^6_soe7XsN5*3aaw&uBi8ALmpmNeGEh z$2!`K?A4~6wA$Nvc|F%=P_H)UNV2_+hsSem8f8&Ev@Vd6e~TwV7TnWjCgM??;JKh6 zJECrmR5Gro)p@X{Dp-{&dG3)Hz3WBic~PYo6lJR?z#nK9bg%)k3U@%WN~mKRV%E!D zGc9sCm1<$+YPD1<(Ku_QP{9K`tWaI?tkQ_>XS3PRv4CK8H1P5bto&I{1`oFSm$cgg zOT{eli}(41{6T~5`czKkXM41Wi?da>7Kl0a3Nxrh+G_hN)Zat34Oq}t(Vf+CK`%nU zDrICjXC%zB3SmZ>g|ZBD=;SHNiMqOW%knpE%1MR2%`{0a|~x1CnE zyg3>e=#V$aHUn&()qt`36R3pqkvTy@hK>~($vv|yFl2pum4n$gm@pX)mW-8QTDGz> z=zCR%G091~E5z2d>9;ogsz_`e%`%7`vmB*j+=i{(wrAC1w$81h93%y`J(6~`r~xRc z3sAwrte1Lw_w(_c9g=iN z1@OIk5)Qsd8)yvZBZPPWrrB&Zt?~HXsIzjl#M6#WxK$L@PZ!1zpMSrL^8xveg8*7kXab@g0e1?rsKg(BE_O(OlwUU43we1Jlc0F?qH zpii15!1K3zuXaWA-N{C%UIyaqr4cp3%5@(pN>R>-D=7j~io zd2>a=lyNghrwmFCdU3(ocJbCc$VURx7 zMMw>xqv6nHDM>y;*sK*4q;||&ziCmPf-U;?{f{lqK}G>^goZxfLUN~v$^}R-L5pAG zkbK(HVx|q=IGtqP8iN5IyW9OB&WEkApbtJ{>=uw^9|@E#_Fy0~b^ zw-?#+S7z63?+yRp=ZZsE@)1TeM3+Lt?0sQ@3w@mCygF&c#)ik6^H+zu44)IY^5)W3 zsE+$6RH&$lUs=At^TkQ;EFCv;igjuhf2;gVl-pl^N^>8TTYs~5^5ugc(di#fo^+_? z!1~1<*P%?nVA`5pf0FjyI%CC~Q2xDe5nuT3f%17nli4VTJu6nj0g_6!&xo`FXGB)p zaU8XsZr64->Y-bJb{X@JdbKErIUh9DuU~In@|SzHIQI#*2oHa*#k;6WJC&J#u=q!~MNioANH0omd-J*XPec3)_>sMhT>e~} z^T>~#)=cp;Xrnm6fzxwv1U?4#mxKkB5^6sKPQ$%MAqPv4z?Z{d=Si#}enx*9YHQWJ7VHQ_7*e$X15cl3PI-+ z3*)(xbV6339nRb!>Q|kBg_v5QhI9Z+tT^6T8EE&iFh14KPT?&U+ogH2i9-esOmuv} ztDc+1zb_v;WN^|j?kD>v%jym7Ixgf2tuVI)kWls>utq5pq|QNp{sy(XlTxs6K?~sY zg`QnT=IXsvm$7`-{sst3HQV2A#(CXdINW<$7j*SM?r51>I&)4+>yKMoW|hrcI!v5D z`>m;JP8zq#)g~rPoAJgZ?)d8)JrepMU zI|a6qz&$zSWE^r*e(yOt-TV8n+SkDf3F^Jz9XB;3Dty&YR{&+kfxRlLp6#P!y&KH$ zu)WWLH+9UXzuDn0-4ZHyQcpiXt?iS-w9eD4lj@(_{TG-y9J)@4rTlRNf*wX0PTMoLO1(GBtUK`@r_L2N( zo0yZ^U5dSZ4EKH@E|vmqKP=*6JNKu?{XAk3E8BMODaO{>mrWj8VS}f=U>o|u=F3Ac zUmC#c4I+u=0M1RKhyk6%#7GoTL5d*IjzZ-ZE(r$(Nq#j`g4=VvBFiR9edx0}QV%(P z9F@K2M|-3TA+AO}Fa*X&_w@Lc__#3j#>!KlZSDLWb+csOSX#eRJSlz>4ux{rn{xNs zxH*SQR?R(fZ7H{*;=O*FZ+|em-+yu8*B8#yoFn(=tf*Oj@*2#D(Z;RW{2dr6ziViL zx1C&8trgxquwwB5m;xzngxuKAkQ;M@ED-O)Dn{*l0mhI}NRGv_G?}MP$NxMdp=|B! zIn7ITyMo8{6+R!(ur$rLt}1lOdPrz+Tqt0Lys^G#kE4yO z?BBJKx%ISJ$)AUcW%j7mNjLHv2oPpLwDZ6{EzfYu6V zErZq)_L>8G;{b9o?5%oEa0=U8RJAr$(&0I-tB&@)4m|u{yoJvZ;Duj_ytqPE4fbZ` zK*6qBJ4Xil2mR40_gv-PaNEru4o}d&V%>^vMq%s%r#!2tmqBjB^*B^aFm6qknN}VA z8g!8GjO)cW7b%~3yfUF2wyPZ-@cc-8w3-IzgU5qk6X15@uL-z<)w#IBc5BoP6QFba zrT}7l_R|7fg!3e8)utrJtDm|X;`emOX_hCY54mRk0a%^W5!jSrwa)nFs3X~arL|)G z#4T$q6Szaohf2pc9A(uqu%E(3;(m&z19np26(+We((|GwZlCn*n{df=Ri1cMtcj+_ z;aSKh(ubH&)PRzC*k)n*cgM4i1R{MXE*nY14lVc_{XwkBrz2@ajF=7D6TM-euv+xz zYsz5>$^G#3!b`%?o~m+^1QFM5%=~4W!@GB$rGEZ?u#4)i^bhpsoOv&QFMo}}Kt@;$ zGL0+jME8D&m=%ytnh5)A&+Vzg00EbYKxKdLGKhm3mv|^`0iYo)B9n#idp3QYO%M8r z=^ie$!e87*!&lZ-Zu`T7gT6bQJh%Doo=j6ewrozzT_B0Re5LM%DK+rR6RnBV3P=jECF$Eb< z?rK#;WrWzOqxb8USBj|~?!`BF_iNXtal>slXmVzs1wTXF!>G$5f%;H*<8=hdGKXZP zn$2NJ9;QBQfg2e>baJ1t!SXP9x+OkLDbc#IGH^H8Pwu^1Vk|(dqa z7vZjNK3|D}P?%iH3YXK0{!QUB z{fk%R-o4=q`b3TxY8mh6^~mS@ZzEpeN3}n26upMTVNvR$Rl;Ca$P5L}i&s8h;5_^N z1D?t%|LLn(sq@8l3O|TIz2Y(*RkA3rM35H`@_NA>#0pH~!-8OS5FJE@`ML%4>*tnk zN$jU|)@gJQD{6itsb_++zuIG>J)-%45R~MHcADM(G#d!c}T2D_2E zq1_BN2l#|NGnfC#R=WGo>RJB3y8i!Z6#tiYz{WUapzvKz=G7<= zEA8SmoQWIFRd74GqueF#9`_R;#pm*y_&*CiPz!rfxFt!DG)mr+{9WoI4U=X|cgQ?t zX|h(?HFzDTzf*zJPN$1b-@;q-eVr#eZ*sow+$GPJZ;<~%{!f=+mkgKnE>@RMTz*lw zE5a1R6_XST6dM%3cMWjOcYWFQuWnIpC*6KldMQULS1C6u|Eda96{`-Y{t0`4v(&Gv z?`wEXx@Ml{HOuvw|9j13*Lp^v%TN;zV3a;`;iazarf!(v(%@?r_JXz zpSOKJ^!4)X>pR3Z$G60Hp>Lh<5kFVIK)-0e;eLgFWq$koJ^VxboOZ1-lP|SG{nR6bgsQR!IST>PR7fg%nC=!S^|&kTZ(sg>txdofJxsk^;#tI4+W{!a8Wf zJ{#Z}frRp%=#PO8R<=OR|xIeE=b84A*t&JE(?wu9LZ4OHI|>%)rm4^a{tvK-2lH|2YO&S=zV}*GP>o? zWZwH=yuL!yB1Q7{K|{{!#p)L?5T#CdtA zAo{^LBovBkd;NVzc;Q9(-7*Pe8h1!c;FkmKpZrZSoefvcMG8L>A;2%>+#}p0GtonC zg6%L868*yH;o!gZT{dYTR5;W+HE>0GLU*%!_&ZL7=)uFY8Nlx6p^}S0SvX|I^>8L9 z86=aeCfCWwq>Dz=(cES3Pu!P!cfF53Kp&(ZtWVJ|)*lMez^ukFWs)qihkQsrfwuXM zwpzWH-VfR)JZlTJ(wn>f(siCFy58;D)HU1o#P+T2ulKC?-n@6{-s|^T?`^y{>7Mb= zXMwB#^`AL?T(PBSOu^{)RR73+ zVWAH&q@UhOOH!?TuwI=u*_djaoDtbipXybX64@`+ zm{wxdPu5%ELkKZuz#X_`oNU#X=&d2}F}c^}5~~?nPXAR)v%RIcrzKVChmawRgi&w3 zkz&-JqQ!YdaNdw&wCJt>!1IxKE`;D0SNLKuz!S(7<5r()OSsc)tfXFlq~E!Xn@*`nX-R})s&VS%@kLgCGCaGHPu;k2omCxS z4L7D(!&iLm1u~ju?Pp9$wMH&j%u6=|^Q zC&F%8x#3otUu0l^zGuLGfR&Cz6A}bf1rZ1Ze!hrutM#CUqgSw{;Ao%yU35W%R0}?hE zm>B9$nMo;pv98H0vVYf;Qs1M*92H@)awY7}x$Zk2W7wTF-FJE(FEN5{vqu+gv`%GQH*%S)+{et?tHTyA{C&##ZXg(M9-({c5V!eYh2VUDxrHH7XUJ1=CO6 z$SjSqz;GG!iryxsu6suY>V1!y$UtIAfy-9U;b3JUsT+%?PPYb@_)dj!H(g)kYp|Lv zpka%#XqttY9Y`qr9*~1S=oZ*YK~eT-V|HF~5opz5!8_~*Lnj2M{tAt;$k&br4AANn z?4&Q^e0d8rRKW#(8k`uDhXAz7f}P+{fxz)9Gu-4M`XcH}x?2Mq)^L65v=m1>_We1e z@P!W^p3#j>%Dw`g;TgUL7~=RB*^h(UdIw>6+=&S_gWY4dz)itzC$P`q?3!JcUd-tA zMaF4Hi?K{^HRl#F5i#+glpVrAncKCJT~O5fTQ6aOn1}&xqvRaIw5CP$$dC!wnvUPQ zWeqm-{O!!{+xm@8#_Z7>nI?=5gakOxv=U~*=0R%cHjI2WppD>r^(q+BIG{HkF`L<7 zE*lKixY3w7b)#`~(GYA6{-nZp1*5GY*)+Q#IkF$Pw&Wv5x<2oSnXVsQT=cdI=BD)p zMMpWx4KGQy9O(o1ir&@}V#cc+yUH%ICVKXTVakUuPT1b}Z8ITj@UDOt@cWcgl;Aac zBe+J%lvAAjnhM(;2|+?;h^eQX66|-(-53P8=48LN2CrGz-x0zj3O^8Nb}~Dg6`U*Q z3%_mvmyW`f(=Z=8Q*ulJKTPC%1fBvO;qocE=7_V|*WO|cv@l!j9FKty2k9}zMaL8b z9zzI(lGz`ai&q(p447|H^;4Oltg@7CEU~b`Mm#|^@Sj?#aTut{I1Ct(Dy(wjv}CJ` zF_~RYV%L-G*QM;b%$RJYo)jKm1LH2&N&yy(D>A^4)caiZ-KhEp)073A%0|^Uk>;12 z4H^0|dKxe$FoPcx7(kVfIu%Y-{zp7XvSrbt zh=_@c7MDk`zr_)Y7UM}bz^`5t2~^9mJ+B5BGUqyHT z;cE!n5x#}citq@+qX>^7Jb|zSc{_>l6vDR=z6W>ZC?7e>M~?E5qkQDBL+B27nSA6Z zA34fLPMCb;gvm#a@{z;ut+I0_A30(2krO5#IbrgV6DA)yVe*j^CLcLr@{toJA30(2 zk;AW~GRWj3Crmza!sH`|-&thTnSA7g$wy9@eB^}5M^2c0o&ka&|XOr5GEpAk8K(eHX&?A*n+SXVH?7&h+!MT?Fe5&xC8N= zg*GY@2mMteCu-zGO&BNeG8;n1i5fXkBPVL)L=Epl)xmYfiJCA@)P!-OCX5p`VVtN5 z<3vpuCu*ozybX|Xq9%+JHDR2n3FAaf7$<#*1Zedka)cppw-4~cU_bZ~gg(F(J2xR@ zT=fBd4g*X;$oT04{IE8S2%8W#BWyv~im(kKquU4Qvi6q|+f{(ULqQ7il|j~v5RfW^jQ>#NITU$@w*m1A<2e+04n>|rk>^nMn>uiv z@f-@HhCR!84uw&}Amcd{Mh%0E=TOiNYsq*HC5-1Vu-ld3=aeA5aG=Ow5FFu1Hym+> zBhGNd8ICx^5ob8!31=;jkX3)A*dHnOM~eNCVt=IA zA1U@niv3ybEwtZ;a67`65bi)cOe6ilq8KMv0Y;;CqES21D5Yq$sA$wqG-@XrwG)ln ziAL>2qa>qIlF=y1Xq03$N-`QH8I9VBM(sqSc4CN9{F%fMHNrkHreY9t4C0Idoa{<9 z!Wx9N2#ldXCU>;t{$Mey6UV!Igz#8LVHeqdwkd_5uF~V^O$0KiSu8D)*G05hc zIOrXNY_5re-Z99$P#oG)9NJPG+EN_aQXJY+9NJPG%tx&KF64hV!aWFILAV#;K7{+R z<*Nt}AbbsBJHodRS`i*Wcog9=geMSoVDC;MJcaOWgr|{PX18%LH!*%LVoxt2WTQ0> zM{7Lj2(p2o9R~Y=&BueT8LUQFgRmAM{60BcUyJYxw!a2&5MbB=P>qoJjX{9tFu)LK zISBO2U^GG#!r}N-D#A2`=?F9N?kI%tyX^2(9$wGK^U-)-fahZnjzw67w5k!-Ago1L zhj1;z_1LlzVH3h;ge?eL5w; z51~Dia{`PY2AP}_ARc3o$vFYyF$S5O6Hv|x5Rb8QCg%i*$JjZOa{`PY2AP}_z$zGI za!!CT!XT4#0$2ruOwI`~Mi^vrPJl7OAd_VxdVs;`0S2Q77>piZFnWN& zIDaLg_e(^-mx%gG1bx*(tQ-Oq6A^zR;!i~UiJ-3?a6J`a8p3phnb@AKFA_0+P6U0i zmMnfw1bwk{7C$F~z77Lq@pB>>k55%0#cG5#2x}46AzX`)dA3CCS0eT+5&M;h{Yu1s zC1Sr4L2HcGE`+-g?m_qp!o3LhA>5DfRfGo+zJ{kV+L+tSo-VKl=yo~TFz!bcmg4bbx1mu=N*qo9Ab<_;9IVA-o&ss7MoB}Ze zJ7>?P!WuCgpd8_4gjWHkBhGZhnT|Nq5obE$Oh=sQh%+5=rX$XD#F+s&SHhl#9N}ez zR{>@r&Md^4h3&Jj{Ydl%Bhed-L~k$>$Noqh^&@dqj>Hi+5=Y!f9C0IY#ErxeHxftO zNE~q^am0zqD z;c$i7QW5s0 z2>Vh5{^u}UVXK}Z^gl(2p$H?iB4`hi!Z-~|T;UvE2|>u7vfxwfhr7e!oYA%5Qx<&6 zf=?Brl!{SG#VDm>lut3rrx@i^jD0W0z87QPi?Q#;*!N=WdolLC82es~eJ{qo7h~Ux zvG3!M!*R&rIPBLr13E6^(R zz*Xphs~{3)ZP*I53L;?!*$T7@J%1H?$SU-ZRp=qB&_hnoPBM;TcLpAbHjXYE%57o#+ zHS$o6JX9kO)yP8)@=$|3)F2Nv$U_bCP=h?wAP+UjLk;p!gFMtA4>ia`4f0TfJk%f$ zHONB^@=$|3)F2Nv$U_bCP=h?wA`i95LoM=9i#*gK54FfcE%H!{Jk%l&wa7y)@=%LB z)FKbH$U`miP>Vd&A`i95LoM=9i#*gK54FexWbZ&Dkjp{H=Hfc!p$>VdLmujo2Z)ie z4YP+jVdLmujohdSh;4tc0U9_o;XI^>}ad8k7k)*=sUk%zS?hqcJV zTI69Z@~{?pSc^QYMLDcR9@ZicYmtYw$irIXVJ-5o7I|2UJgh|?)*=sUk%zU&!&>BF z9j^Mp-F_}3%;^@x8x;$M%LHz2l+2mX*DCQW~9}Ow3?AtGtz2CS}jPc1!=V) ztrn!!g0xzYRtwT(paoSoK#M`Prrrv87-Vbet$>F? zwx-?+co<}B>aBo*wP$PUZHQqTV%UZlwjqXXh+!LI*oGLkA%<;;VH;xDh8VUZhV6)9 zJ7U<57`7vZ?TBGJV)#FWooi@ZMHI)+#x#vmEmcGW2|*DRY2C(Bq=;y3i&$;dqN3s> z#3YTb*|?jn;tM}$eSPtpxwACMM)y&1v-h^H!tPo>_*Q&Zt0;ck%bvqn307US%_pIl7&bXB3X!JA(Dki79v@QWFeA;NEVm{ zXS8IVSkiq7=7W{?Q8#GJ2^w>P#+)Dq6vTi6ensFKXFvh(%dd9^6vTjn7*G%c3SvM( z3@C^J1u>w2zvn1tK!Gy5bOsbCvrA_{fik;v1{5^b1&wt~?%_YwVWfN1d-$*6(pk)`^s~~>NY)#mjur*<8!q$YX z30oJoE^J-cy0CR&>%!KBtqWThwk~W#*oLqTVH?6Wgl!1h5Vj#~L)eC}v9PhQv9PhQ zv9PhQv9PhQv9PhQiLi;ViLi;ViLi;ViLi;ViLi;V`@tTv{a{_bE%_d@DVt5%Y|3U+ zHk-29l+C7WHf6IZn@!nli8Zvu8d{7+i#&P6*-%TYp(WPP;uqu^XG1N1M~l{0j&0@G zR*r4u*jA2h<=9q^ZROZjj&0@GQI5WY5_vQeAl z`W-gRXP&smX;K-Run~53*o2j7LNMjT+>ffdcpps6p04(!Bl;bA#;X zL1k5%wXCK%@)+(|=~n+Er=8?F%^hqYhW`S)Pp>tUev0=9H86^mEae{O+oe15dE zqqz!Omow|KjeFnBoegnynjjK8dW82F(f|MT_btHzoGwW%_R^w#v`jydx{6jgh4trC*=2AV^?y32iScAt&ch$zq`X1)mY!*6u?~4QD|+X!#&#YtsOM9H zHIypNeGjn~vySuh)-$Jm5p$0ln8~`BT}hX4^2VjK%0|k)i860thRCBuvSYq$kB4;v>*t4|q2h`}h_P+f< zoqcYf*rx=TjN7k7aeQe9?F(AsC;Qo+vb$*CyX_v@Vv>HCwR>r)9Bomc6?f5kKid8F z0MAx@&>psjST8RTs`7|E3R6DJuECZave**)ig=B$Z69O7EB30rX)iMpyk$?&n_st1 zYMK3#>f`X5{uJlNrhMJ~W1@6Fw2yix3z^LF!sJ9cec7htv%5xf`H^gHw0CnMmv!}) zjp?=B&!H7#*+MQ~m>SJZWOH5Rh276}J!9T8Jc_uVc0bXU6A`@9BSz=}OMh&HBJqu+ zr+6MTFGZE`IY60Gnc?Y4@a%x3uN_^wGBYtgjBe>V9uK2$Idza_SleQu?u{WPV|klU#L9(qKI*A;&ORui}R diff --git a/www/bootstrap-3.3.1/css/fonts/Raleway.ttf b/www/bootstrap-3.3.1/css/fonts/Raleway.ttf deleted file mode 100644 index 3b354c87e94c41924cb93bb1888fa5e9f4add14d..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 63796 zcmc${2YjSgbvJzPGrdaFd+$|KG&7n}8+B>5y*JytYp)9~>lg!T2aIiuF@zR+3o$hm zlNg62FL@yt0)|jRLL7<%#(eOFV0dW(VvKk6{m*@7q>)zIU6XvjckR(L<+<(Lb5B3# zVVp5$!5<|XT-d#9pKsxJf56zc-pg3Xzp(GX^mqK|@}&5cvHt-P7B_v~g&vvkeL z=iZF(2hsmKaMfOO!);f8sPpO?W8BZ!Tc5c0^vSD!_u3O9jJ@NV_`QBDzR*+@@4O?V zdo%yM<|)SB_6*vGZ#sG7Y3~D#(~SKqzTGGpI3i}^=xzUB1IFTC-M zSpSD;ekU1cW$6a?G3ha;VD7e3A#rW4ZRAX1LHurJG3mk4oGsO;US1eoly0zGhHn*Y z0DZkp@kXX$dfYSJw>kUWd;bwTe2?pqI4KATgDeD={upF;xQ_AaSL{qzpPSM%B2F zn|Mrx5vsh(W2uP7ridso*Z|Kod1m=|=hMfYc^wbmM`J&7uJ!oi(yg6$Nmk5a{TwW8 zj^4c@4_G%3x7nRI@0s&ZxOz=6KmZsziVU@pW9c%TiFmyToVSN%Cmu}-m=^KE) zhUMES8w_#mBUKq>wt?SOqEF1BkGlBmKX+8d(ZO~A?XpUI?~qT8?kx? z?KU=DtQ}t(drOZv>cEOO4-MhV-X6+$Ne-Y%YNJr8*xsOiAc!rbvi5qhO9B$ zk4YwNZu!B$?!)bx3{E`<5LGe|bsD3jVmj6N05x>ajoP>TU<8fFx_hAkNzt&{x=xH- zrMXZa8ehBJZLZhq8?4(0ZDwyC7wbZM*H~L~i;uf)I^o4XLTwly|9^wZQV_8?dG`=uzjTF3{pL3nB6t#Dr|0{1H zVzq>Fp1(=Ylzq}8;p$YRe#B`#Rr8h;uFiit6J`EH=V@nr$m=V`=!|0DR-TsrSo$KS zQ)}zvQIBiDq*f}ihFCD5!$IX(24*hL*BWJ#M4N^s*c5^_+XQAgU7DgoV47V#kWsP&S0eHfvxP~bspog5Pu?!L|AcYY2DZz)tLa->63Y(O|+DuXm=kUMV ziw(WdNmK=SwE{vKi>ft^qN27ns0R21Ztc?G6wjMW-losxD4Ozfx9%%m0EUAj^Se@h zokJVT3|9gb`yCoX%s!}7?Nv@+{o?7Zz?vA%xD`dE6beS;2CcvY=gMyOU0}7BEwuG+ zr*)9vN_bE+b1n&3dN~+b#AK8tI;1$CGC&13C((%vPrAejt6lx8cWL?;m|9(5GZH(0 z^4FP0`sOByGxtuMIV1D1a@)+9({8iilR?3WkNB{0T?7?}iw>F+j26P9lIS5$5FIR> zF^*%DlTXyqpC7pMK(=)Fj-A{bpSx=6!yleLJsXoA898y+(w>)GR^?ZnWH>4u~$iDVo3u+z!M?cLK(!fe8UlihtujZTa| z+W7;1yz}0P3F(oE6*k)W1@TTX9%N|ZWINh+rBXSd8~_XLj;bJ>ZGt zD=}CGr&FRKCCM1oa5YG&m<-^d!T1~!w5@Lr{4nI_m#@u3k+NL&%m>#dvo;qs@MCw| zuF+_$8pxZy=|CyKT!v*y_E}HICX2hgZ$@92MPEMJH>tJ|gU{L4<|WhOhT?UAk%rmW zW$ma|OERa{rnRk2uU`TMmv2|GHwJ|sr~{kPmA0HsnHqeiaNp{Eq6 zgh?rAw5=&2g9{*K_){DfaE7LEcBwLe}Gs*vA1g#AEEEnyVX|;}PWd zK0Km*?8hS;M9_X*ItX!e4WAT;NHCQkO)}{{z~Mm_0q1g(RO$12+%5;c8PEvLOa};o zC1Wx~B?&4@Vqh{ZF^z`KxE37SBvb#YC05(yd^uu*Yh5uue%>jQ&l%rV=kx22TIZ>H z=T~&vIE#WO{S>sm$xgRPF>12rNMpEKDHn3lFijbR5|Xf5N&7je)8e?Ll9E~_MW9nk zdJdkez|?hIspY*R0ir<5U<~A5t;X6?SdC31PK0ej0piC)YO4u&h0bg3OkzNReo1kzOs=s`dm3omJ2$N!=C9_y$zio*Hx-R`cx3x z+FdTOX+l|2o>g2Ru1x-V#O5gf=gzHsSLdUkGo9bHI)6j`7gl~Jy+!&G7~;#?gXvT< z5s!s~PP+-TRY+|`aMiNaBB>BL)kvW1R=YXj!(-5h#L8$SyYnRYQtv2-< zV%BIUxMl)+NKulRWl+Md@HN4r-l!46#iZj`-nn?&kxKc{Z41K(W-69??B<2hD`w)E z#gonPo2q~Et+8uvn7I0`*@e5W9Cc-y(fIU4W#9G9u^aZ3n&U61cVJSHVfzX})2o}) zbdQi!l|(0iT?&OUN`xI!8>uMV60=0`s^YKoiuum5xjFtm5|;V)&c~!jI-liZ@)+z- zrO)9|ht}(YCb3bZ5P~j~83pIaa&%7m+__Pjn|0;a{EcX5WreoZGN9K1r?KAw{KTys zGBSx}V0Spuv)VT&_M9)z1%h+C8i)Gw%qOqw_eg?CAXbWzy$5SMfjTe4%p-KmA9K^~Qju1}8R6J3v-8 zvcAy{z=Vl@fkK#jN&)p7l5el~2=)7RVDi}s+=aPLv)`~6@~g4t?0Ot_<5${flKyao zNr$K`i&IYx0Cc+bo11Tz`+z*7uwyPp)(~{e$RNs){G^bGj)ineNS6dg{K3L&G$+t8 zQb4+LT*QJk(|ObJszv&0=Uk@q%-jNZa_54y&>81{f9~Trbzc7O=USKq$xk1~csiD9 z3qh^7atF{3vyRZoGe*JBdgs|jeM303#Qt=y&c8l4Ce5Dv1fcLyX(t^?v=TN2^htJ2 zL5=$@2!a}S75MdL7c6mg5q*}-4J!DWnk~i>^9Ro9z=FTn_8RnwcsS_uIP8OFea4U> zCO|8K1xVJc^WA0XxCXnd5ylFwS`Rf;3;LB=w^~(K*RFQkFtw6H;jXP~tH)R8Hw9&H z^jhgOx<;=lV6r;u<}EcsCtm}yVoUA33;qW#q@(w3jiR}=zAg#=_IdC(8;B%y2k0hI zuiKzwHg1!32L)N6x=c*gBZ%IE84>eT^>HH7Ab3~3t&u(s!wSEB+aDe-Rgd1ju?>v;8KQTIXYBrIYKhdJAYW(!wU_)1pPF{W246!4AZR`4d<>CF$X|%52TdwYZ zj@WPTVdXK*Gt7qBN87yuk;5?-0ppw18*WP)dX5b{&DD?peiqw2#uM1hUFm*q6VP@ko zJ!!g-MQgIczsk335Ig8Ui;CD$7hVp)PkF49w$x_#6acz1fv&iBwrb&D?Yw~R>wKj1 z(SG0om=hBpOU+jNJtzh$v&oN5tW0$NQ(4`A{YVp_#1)|2R|Xsv@_q|i?P59TYJ)0e zIvMm2n3OJ+OQtoc^;%O;z7;|YtqbBW$HGX5C0&USwYREGao{enzRNC(2STm7y0?rA zAj8@k)X>I@@ShB7HMvYAWF6FawO-kdo;^?7y5KToUTVA8N|?-Q_g{Q5G9!NGpDtlN z%I==XdYX?7v0d#TOiK_U^Vw+FX3_d|zJ88PR&5Y0rc-Fwv^1hY$zl61|?G@1%fo~wT=`|WdTp^Xqg6V>_fyzR=JCELA zWkP7a1bRby-X+kS4@20vINjmD6aI?s8bEt|SVNWl5y`@(Vmyk^KDQH|JMF3_Q1Wt> zl+T4j101FXI0BUlkRD+@gTIbQ2lT}rwE+!P`Pw6BqUdYF(L@am64J-2*$vIWA$x6c zj(fTQhcQ%GZlcMQCf0!Z)wQ8DY{SVEmu1}qv^6ek3DT>Y^>L8lh0=j|V8=*(jOfeI z{#bB2pX@vmm`)OLIrqz4k~afW3Hl&Ca-jB_WunVoSAPHSt9KBo#@o)HjGxJNGByVh z>WQ1P{F^q1OshEyKp2>T9B{r&FSA)J0F;(wdJ@y5nNDg4|0eNwwCSf&gfk25iFPoP z=4@tqVyxMyR*L!bLS|tNg9NoF&qQS%dsZ8ItbG%V(swbc%jcUtF1@Y?Lyy64-2rT& z<7_K7e+lhnhr~sh=$4YeC7?Q=zkrx<31{F>w-g>^yVqXqnHeWR$a_AIWdNVdq#euJ zH!S%uh?8Mi#(V59Y2QMg?rPs%<719{WX(+2Adm87amPp~P+u zja1b&fkP@wN5t)=vCPSlev(@o+CTSHVSD(zp_l^f56ox8L1=&0g%)(( zE@nw%iz#C3_b6A~ITCVZTk*fx^?|SbsJBhum$xak&`fDMKjmt%SH)I1Jev2Sf6ijC zUrl1KO5{^1=HYR)%eM4b3BFvR*Wo^>9wcCa_Q8Hd?}gMs7Ggon;D?3vBdCzcUrOlp z@X8jY)S4%O|1NlX@`{75@^ZC#v>i>(Uf%e#=SNfb>^X44SKm_`+20H#W-c3Di{*Y=CUay2Hh!Ei%9#<&7YIn(tYR7O81fSDDPDpeGP(Yw%blCB5nL$OTZcs z)?*zTq%k%iG=>q?d|#qb+(oWemIr$^`J zzJ{H$xl+TyFGQn>wGQecFXH1&a;53OUjY>^8FzmJbj2kY?Z@ zGY3>}%nPd~3k%#jq}V3<%_|TM$$ zws_a6*7#L-&eHpl=j^QzT*TNyP7SaoNvUp^bJj8O~$Z;ebOY^(v49PAc1u$ zn1gLhHYnJHq_+b9)m{6L8b&%86~svgsxcmcOxLv&bx*oa zLL?SH(0OKC=bPgl5^DZfIwK1<9JU>%)T2KOJJL4O`4(nA&^fG8)>wUrQi3H_4JH(U z)Cf{SCrr2#6ux$-|5t(Wn8ey0O42lW)diKzMgd_4%%loU?aG;}PEWt^J`TI%MfM8Bg*|fakNA|J&v2wjw_u(Iib}yZu)XQDWQn44 z@78M|r_+2FK@%)v+mV);rW2aqDl?lwaAAT@r~8b!NF<0PQwu8ze= z$&|Zpz>{Rt1>wfPyRjDXMXa-_#euE(57-hBixy)*z(=rvY(?n0iyAxvvjB%xz|X(m zNl1A(&%S-`D-CJSMC06FfMG~1yz(3V3&{$9M2mg0?agL58?Izp*;XtP40wn}>R6hm z^*y`Sg2RquV&WQJN=iyi0(waZ2&aO!rBQ2?>KY~nFu>tMZdt6KsHX!K4mHIDq*Pk$ zu@jyLUwe78o>Uj@34(=bwL2}~i{7+^sjgK4$?56_0i=WzJizT$2MJKgA#Ua*HBIpG zHJ<-3>FFVFxV5L8+8f?AliindS5FLIakE=%R@ozx6g`tJ9Pw)O(QUD%V}p^B-ji>I zwj;4yU3zhwgyMJUZ-1hso@#=)(9h0pkhwFKs_T zd18DsIIr3l_l%9g0kIi~KtDGFwpNRvoIZ%_dk_a=3K;p?2e#}}b!mMH*!Mct$*|Y` zcVJJUtj`ku+i+T*-5yBO-8fkp*X4bfV&9VYVSMa@`>=niJvlL|`k&s4!x!rI|JH6O zWV6+?+>nMWTRh7>Io1oah09Ogmv3~>$29vt?d;^_=qR0%$?3`IsrKl^=)~sxG}xm{ zhc-Vdo6)5KgIS@|flXn<>RFtfUiYx%(3upr+~1dO z^*m_La=YS?s-ERu?Gh2f3d9NgM)5N6ib=MI9cO>oPVU`1)#hyP@x8|nA6#B)@0r@u zY`~t93J1MzyA_;cl1~nRJMQqioP!WtP29j2xk@)TTCFG{`$WJJ5Tgl7k}-1w!f6m2 z&N6z4BE&dIP;o>}T1jRdhzgZi#|BzI!C|MOkgpVl)j}N>;YWVHKAs?%GAoGm*Ku=- zBE(4DOUOZVntzN>f(0~pmtyk)sP?+$vDCi2`}7r4$6b+YCYx8xrFdsl5v|XsJe6ET zH)_nc=96=0qL$%_DRcdZYf#eb`PkIrQCqYi-K_`@&!y9|!yyT99*ss@S(ia)OIzw= z;1;v>%1|@6bY(+nQDhf}17>&3F&G$%*(QgBdB15m9T~LQYcBg(*_{npf1blFf#F4D zIBdm7#zrqlzxGUw|IhQ0E&KexM!6uBKg)CAfyDkS&%uLT`)z6EH`1G=ufqP^U`y<6 zZD%3R*!*n1QE1@1Tq@~tfngA3a>I@|IvzDc)GZBVV{jjl$kt~d0>>t?2o@6HHiE}w ztCsvxNJ%3XX-xtjS(!|$je#m8U=dr6q}J?4s{xU6Y@UYfMpZM{xDsSWGQ;c}loVtF znLywq4u~11q`ldj+CzKCFCmXUHEL8o~gskklD%)0G~;ZSI}m~s45@<@5&rs69K zx#af~d+L#D%pz%x?oh^WkHr#>RAtZ~U*!!l&z@&{*?+Z@iwndVc5YwTySR65W^z+G z3RFk-(_X$A^-7*VQ|w~wLGNpy+H8Pz?BUrAuo;&y{C6ZQ z#TJ46&+@crHs%35%cFDV{Hy`QLh~W$9_#esUeth{Y^Xw0!({|0ZDhh215Jj^I9}HgEt@cWK(gg)jgoe{X!Lq2dqxYDMF}kjNV!ui0Kz=nvjezsQv@2;ITGX zCgsCG^N_<*30Uxa1aTw4BT~Z}sfH_6)ihihN|!pEn={NQ@`^dbEMn$!Qgp%@_bx4Y za&ahXLj=(jIR2*HSuID`BNq4de&Y6M#a(yZoKM2M4gM~(cBpemm|5@RMgk4O1|bE=u47wI!9yyB z$gbh<-FDAaErs3|E=4^dt5)(Kt}X0})TSf(X^X*MN~9M8*7%;{$W&BkiH0(6UFFEx z`MKMU)+&e2&gZrzOqu=J<$JDdj$d={OS3N1OvzVHy2ge)W$9Ss^eYdThlcBU-+(t_ z4P=)`lfxmCMGYO%?Qy2u{>11~{I2{+Zeqc=c*kY+>d_Z&TX@lBHM=!zw~w5D#hwE% zKUF*TV|(47mh3ub%$KcFtl9>Cf0WMwOTK@EFj!eUH}&FE{N`R|QpGGS5j3W1R87r5DoCJ{;V`-(Q>k^EI^f-DDwKm0!p+(Gy@)@I#a9!P1rL5fYT@JNg<& zP{9|+uMLdP#!gMw506KZGsk9g3)O(HJevvCiwUDLRvFPxlut{Kbv{#@D(*O0ZJb)l zjm1Wn)0yp~F$Z#U-t8NT!cYS-b;p=xkqgGo$_9l{?t06dJUD z7IAwntZwh<-HMk#^8%VfZRLCHpQRswsNW*u_JS-J@Y!u-+7(=kB+9I{7b2=8?^cbX zkGqh!M?pE(=qkXT+Hf=dPIsjHTOqE4IGD{M(xDvi^}t$Iv%u$H6ISry`Y3n2%`iA< zXk4xxu-o(ldZkr$x%A=A?~HM?IbrDhylJv<4-96*#zC8!n{9@s7^#5ud|~~15KV41 zAR%CFJzgUeJ|1C+Re;hb)`Lls^APJnas|B?5x2CS4L1YY65S!z(`(gRPmPj%$X!GR zK)g}sAoN;>NeQf33YV*_N}btYvkho3Z|DaH_0or%23zNsYTKZ3Sc=#?KeU*de9(|E zo8!m@6zkc)@=f+7tVcsOcYL#&V+||t@`DxZjvEpKOtTQoDdi5g&^o}IU~m_kLjpez z7s8uyG?G{siSXSPaba@@N(g`3{ueYFX@#+Q?&=;azscTvk+C7DAXHW!8~qd9dSlbT z02IasOfe^sLnMz)ExKbJ5+@%$#U#?}HKU`zD#&kd=D(!B_?<(}U@#K=C1O7lZM9JkeTgI< z>I(gkoQAgmC|yL@D;H_By?8Nh7)~T=W>3UwjkwMHXmWTsX$^bKW>1*ffwrk&zetdu zI2uMao1vR~=l7kLd*|r0raCv~-f=$pHuy;2q?YpOLam zCegGOsS!seEp@KoW@p%D50}G(H}TsObB%5V`6RoSoq|6w-$ojN3hSnv z3qPH1q&^7K2oWin{?kR!4_Bo=&Z{C$qoFak%r3uqKx;aFwFSx)?pCns%5N1m#Dh@0 z*A8}q;=LSp4hzj#t6EO)$m|FO>?ub|j!LHJ$JWwfy$1gk@5S|!G^~NcT7p3UZ~I~h zbudm6DIw1jMdyH?ZH%|-mr%&6(&%a>eK}9`wXCx!_`7$#>{O$1>Seoj-FIqa-+e68*84m*3)N;I-?R%qBb^OE7ccMltQS+muX; zNg!2IrBdfW1GtojDS-l)QgU1g3=kx3Age|MbP-RZVEx+0=E(Gf=X&HKjoVX~+^#Ef zn}BNa3_!o380h3;2t=mkXfll>R!dSqnai?{k}D{<%u=aSl7q{FwC{6)E5@3aO~(_{ z$LfhUJ|`M`{$lIUXdp7aznYl7HkWi2X7UFv@4VWEH2niRq^WRL>ipUeD9n^fi$iXH z@|5nfX0op022&8>WkXBVfa3I3QZCVH1+yWyq4T?O{)Rv*;Gm4nIc)3_knB~G4m-0+ zuG~N`5TlnXw=^s1&ixnRG0}=5WEA3e%WY>Yh7i0$tdL20TsHFhL^(2pbL~PfK$1C? z!U5K(NG!z3>}PaDNW1DDMgOlSr0RYLj;-sd;RO<-Qu9|dn^(*xIq%FUBGs9sx03C; zW!{d@v&rOaHKfo(q8e$OT*~FPov3S3CaT}v!n4`Air-(ErxFE#fV?KEyOacW9%{Q& zDU~u+P9X<2;Bz^V&yZ9l6%r_5y8$s;0)v-ee~V~2c%u>lHdq{vY+sNySh>7f4G{wtCTLiTLla++IxD#aI02vJ?5pvsklSsOj9jm$+m_Abja}bP z=5lgoM6Q;rm4_lBpBMQNSzWe2qRk9Aj3*Nk$p6%1Ti<3y3H| zvc}G9NN`BObW2j4wo4qTw$ml-{%7E!z3N#2LKJX1_o7RM!`lAS`4zZMCwQp1@eB)G zFP9L8C=N2=`r1KOtAXq1pXM&NJzp%^^fZg~if3`6uOOe@rLB|yEjjB*7JNzy!={sB zqih#@UfaBV+jM)RUd(&lUB3X;G0DXSBxvnWog2|pHz}N+Jyxk5or-(XRj)f6wxuU`rPI46)3!*? z9T-lz=EBu>C^A_IhO3j|@MI;_`D=f^?(;Sf3Y}{NgN>}`b3@DZK%}`n7i|?HI(;Bn z^yX)ZZg*ie=PjlJdVQ?e3d9>pyCXFcjfrc6UmYlf1_#5%fFD;&2oeE@4Dk!aEH44F z&%(ylfJ88@kbWTwvxz?VZ-1{o_}|EVNNk>chTkf3WHrb}-c&D%F-ce?WZI0~TuYoK zE`-lQouJ7j@S5kv&ewSHGv)Gg%aq$Du?+a!5M<&w8)4IJW37s;u&~o^)KkP?F^-Bo zejg$Zx#Xr22odxMGaLj^ihRTASj8IPfe16#^rFjq32sgoqy$Z>kxW&cuExfV=Rez* z8;P2;izjNeAB%x5ZBavH7I?!nmu;x zNOtPF?V05C;cEHtbaHBV@`V%gp{Y_Ol4^89$?1we1k*&KUGgEj59>UP)xJae3ikAp zbiCC-!#*9a0clzT@^*N3cJ>GSM;+G>L?SZ!Ug@CkFI}*2fD3y>-Zx|^^(m7`>gm~w z8jzvhfxh_=0<+cr)VJm^)K{80z00Gqq?;e6OIR||v zaRaA&)f8eE6^@0>#4gl}AAyF>*sw;snTsJVTKXAkTgRnq@BxhE|~w z=1$UUaI2&U<$b32y>IqCvx|$i)L1&vv^m;Cu9(}RvKxZm(CIA&TOjGyzeoCjH$Cj3 z#ql@MtDa9TG$MogKwN7uD9T#%o9%U*QR_>W9L4V1-;T9s5EF4t8-?q#jclV*%E%=y zU=0ZcJuc)@Yq2qmIO?Pw>b1it8I(oN4GPpbg7*OFw!IzdH)*fB4G~37;Xv3fTE0!} z*2eY9E2T;i-T!RZQ4u0U5WrS;m+hLbc!yF!eRyyp0UBrG%GrkjmLINypnuJJvqfDt zI|WEO!!kqwl`qfr0YS!rm8TWMfJ2il@Ju`1YH`+DXe~^)QBS3mNuh3;C;>xwN*a$| z%bL6?{B=$;#3c~=Jb^%|8Wqin44MHh4U}mE9S|zb26t)-$N-EmnY!3P)pMvQB}8fE z0B*yn(Lx6zclXZq-7%xWpfDP0tKGuvet~Y`99!2bV&V3#b*RMro@Iw>h(mDvqFbzD z0Qe1dsu$W4{5NK2uGMHQNoyeOGpa|D{QI_4$nMM6{WEK*UQN$e1B3cd)Rk>U zI|WC^FhYfG_}AuKb&FBsOcdP|=Zy2tKZd;yu-Ud%&KP$&Q9DH7xS&2p5FS&H`hfI+ z0G&sD5YMcVOS|=gZ1=4drJ*BTlq_)oToeS3@J z@zOr;B-a|v8jBr)FyAhFm-$F!Y+t2zXgq3*S3=S9n5WoICdTvbOiGlH|0_~?$YsZayK7{b)M|}%*XfhW5Lb?o%a%dbFAFOR{#?| zXv`AXxsd~*XCgC!3Wt!Ld&q>9V$BkXLlSS`$TQ^#5;UnjOH!sL-oaKwA0<(@PF0K4 zP+9t z;RUG^FpHWIu^=o~)%ZHEL6wQXNZYAfc!O%6yU~4F> zGNeike}1;)ft^%S*mj~?zj9lCrh4PKU)T4I_}leJWyq14%wAJzHHo6W%a5X(iLvb| zm`fvqel4v$4Sf3|t02~Ruu_hMydJw1o^U{MHUBo3rLz^mZULomtVpy2mF<=;5OG^D zG0A1+5QA{Ry9EUzvnQI1BsCF4iEI%{10~NfmFew9b3nN0kspAon>Mfc$z?aY^AicH zr9Nwq7Cezk#4;7EE#=d*m4GFXbT02rFP@%g^6fift&D48vg*tD&8|#6)X_)^(4c@j zI~wy<(gD@r^-I+q^#HJ!Vgi26za-F5>FZm*7xqfv!()*5huf%aOkr?f%BUuuLt$<` zFn~v}`_Q~#x28Q*DjiYKU6P1M|B7JCL}051o3|QL!dGU;M+41DLN_}bzG<>BnX>ZO zk;ATZJ>2;;qDDSGIvW|?ha6H_Z$16{>8-Jz-ikHA=1O)(4OX$K-s&X@9~&=x_fgzG zAe18H#K{@%a`CJsXhUR>m7agqRoJsx-1qrzzo;pO`jw&*xSaXsp|imN9buv5d>{%P zgGx{d^@?h)03Lq;o8uj`!jzblExo{{m7k-{57Dn0R2Ox{P>WKp0mYZATKQ$`;Feu? z6H098eNZ;=RcEEH-R`x$F;K=6WBg0Ejycu)ykKpyfJUK)sUJ;5R=u!74G01YF{;XfSt2#yB#uv-34Eb!)(&3srnIdM-<)`Oo@X%kTOdDLG%JUpxqXz3wkXH zY}Kq$;BIj_@~;>pEmvePX|qPWgR?O1jLiO()loF-&7P=Til2KThGYXp4j4iB3S5&k zSf_zi`tvRkAb`2}^-wp#sDKqgG{Ah3vx(Xt71`mC{PPNQd`?(a7o+y972vlDr(Y znXGM}4F?QClq_%9hw9Q}=iU*Bs8tQEzJ>=a&|0FPfuHNqK$)f_9478aMEQF_0H->a zar-k%pZ)vgr{(*1u{$I+zX7sMMdX3@)nY@uEN3G)0oV-4By<#jPLK`gB1}RY)`mz; zQjc|B%5V7TgA=$PuvF}ZERbN=wXIauoJVXSxyTe1^v^+rM`P6ixU1v6*dS_l8IJRS6FB zh_?9_pCNh#TFr=73tQOhxnX1kzwchjODXt>!t8tP!7$cMbQivQ2p56}ll3$ebn5VV zfNWn80;0SsqQRmtCdn}tSXiJuQ25$KZijrddOH<)FH-L)%PV@vJb_@mCXdo3^fXAX z6;zGN1saGO<(&cao!z0JX^8MQ@(5Ev5754sG79O3^pBJ!wtMyugUxcvIP1}y)UL2O zJ3JODkC~?=UFWfn+LOZ(zS!C2ACtJ>vFIzt>_f@U_hek0W;gIx^1s441dMfpeJG%8XqJy z0zwgM)IHxn6t#w1`+-Li^rfp|XCGxzR;L)4c&wO@)#LS0z~vY;%T?MNKIFgHtT1p9 zQ2^OfAy^Fp8y;675k769Cy{4Ru6j=XvUQ>FSlXPsljuW%Op@S5M{)hYr7+OrFOd%nr$k{O6jP`lRw3SO!-NM}HFckkf{ z>n5>9KQR2vUZ4xT9_&NzM^2d8q8pfcw#GK{i;38a^B$eBDIUK40>RLm;way-b$iC3-KfRU(C)rgk{UrH~%d+6TR zS6bCiR$9Y<@S@U7UR!EaK3Q&6p7&(w?}qq4e762o{HuSq`bGTvug`v#@R$6c1@N+q z*Jy+%6O0R3ii1i~G{m{rltuYGQVd#uJ_gSsVKSMTyJBPniIcegI#8u6oD{=wQb0k} z=eC`yH%@KK=eM0|)K6{8abteD8HRf*pWD%lL|QwDZpwbjf{@cLp|&9T-dAg9i!eG! zAmBg3_r6ta!Sm)`f)ITCV)O61+b>}eYiqdF+JYBd#-=`Xvq;_R--WJ2{oqB{vg$^^ zgynR7=!LGVPPGO1^s2#ZU0X0GO2GhuRwZ_grmLc3pVTBWit2*hct;X*&-av{zd~}8 zUvtsr^_=4uU!4N>p5G|`56(pi+SD$tX-DVgDk%9sw`*?K^3qtVJX@K~rb7Xb8&6u% zu@W!AizAch2I2xV@Cd@_f}-d++6twPOzT>%LG%Z$o2)(Z48g(CCxuhDBO3)PrDV*K#T$vsMf5iq~0zDK#4i}|~Cq!t&#jun= zAX1RA@8pbs6XY#Kii?P2D}y_U(gMlzNxEhNTtq}PD5wY~^gMFBQCW2?1r}JG#;#d} zYROg+LmZ=2j|LRJH+4SpYF%;&o|8s7D$P$!Oz;Pce)r(CHyTuRfYw4EEAH^ z*yiIC&!h3z4NWbXL=S`MnPH)6tqzWNPk(Wb%IOOj2P1xKkw3QpE0-FltuSb}^3Ge( zS$X9dMGNDm5JA{Rj!ZBO?wxL>Tg?%AVnH5;di;jE`W~0rNY7*2J~3WUXtXxyx~Su> z90eSdkv1iFY9NCmrU!B-CIupdcLp7vJOxuY^kQT!b}OoYZXsfhqM0d>CjzryW1^QM zjif|+mI2A78nXiCWKtdb7o-ptbxAuADu$dx$Oovn(?ORepme83;tLD@%#b~j^B8`6 z?yLPPKeB3pPc`#lqi)a@a)t5+i(MO5A#xSbZCSrnZSaS~ru=zO>U^NjYLAt%B4FkM z%*bvYh8yB+J8Fgv#2iMFEaJUT2@Rge^|o~K(C&=KYzmzoH7g+Dz@km2{78~3gOF^r zhzQZf`t9v-QR3J@-2m(;2nrAN5U{KD8{HF|gX*JQTYP7KKSXM)5P^mM znfx`c|5RiHa`Z1-Vnh5WKMR>I319rFwl|$3+kL8*u0eOllYT^9qa;tl1J-UMWR_}E zXm|lZZkhms1e9>-Y%FJl5=K&QeLj*_d`Ebyb2VA|zQ z2L^RIf3A{A6qjaSVp?Zc3IP zk)VXzk)AGjy`|}N_jcMA6XN88p+I$gM@WIpYV4QLBVb7ONk*qoBggpUBRJ=JxEb#17iYa=``OD+&yAWTZ( zyeD5Kp*cAda1Esk6?&hV3pk5|(ZCbVikAfEPmmNH3p|mpByX4`0ora2)sr_)k_>IP z2DqZMJHYpvEs&s}A!&MOPoVP`lpfxL_hSMl7TCXEVh!A3R8Lzge5<0z9l}MZ(QL{S zsR}N11X5c`>m2P>!DZUD(zTb?1!S4Y&06bp7+CHCV$6jmAqQb!OjX%BH}~R7%QA)*qA z+(Le;ny`L#&5m8FAdps8*hLQR{^_ejv*Y2b$LhzX6Vb^-3)$JS7jD0dccc#^T7q&2Dc+9kC(r{eBP$!qfQ5gNV7KnucEFz@maF1=)c` zp)PjsSzJoW5op6F0z(qQ`B4-B6+Fp)q=iMB*f;1PTv>lAX8cP6WWVMih1nH{Z8?%+qOSDrjs_5=@K zbzN!a$B+6h|1@UEQTOWK*b}{eObY4;`L`%@Aj-}*f{G`0Ojbu{J;{Q7I8aSG`Oy=f zzT9{8<2y^&U3EC7Rob6F$JnduGwxi=?a@Nzr+}Mus9msnc z&5ZWvJ&|lQv1d2<*uI^T5|1>1wH_=TVfrKyAtXR8KiqUx_Qk^upe^(%Ya#?|Bfsdw z3^K{lGa*;wG$16cR}!2mAsu}tRL{7`3mR&q-R^WFif_J$w)m6c zC%Pp+rs$KN$mhq{3z4IyU>lz;E4ENp?cf~}SrX7(r(35^(caeB!~8}`4V!OG$j9eB zzs?6yoJ4ZOkWfgFEGvPp3~;%`F9H){5SK_3<~P1*;zci-;4dC|*~{=h?w8mc8|U{) z4$NzSy}0d#F38qDu@1kWdlBK20i8%7vsakqKEn@FBcg=&SESs5+2{Mm)7-(Q~7 z7nV=fz@qb$rK``q$j?U=aXi|wg(R^^!SgN@5^=63iAgL5`2G!QOC^943vGK608eI; z2&2R|3CNNnn-tH{CN(qyksJFXp}YoK5#8%P8jQs5UeE(nmImS!?{`%e zirRg9CT}lg1FmG*TR-3&GUpqUk;Hr>f-gMQuy>$2`o-y;UZW>oNkmGK!O>hWREk(! zrNvUZkq(&kjz}r~#p|ypyo|5p`2XThi}~NS#r$RYfEGdSN75UBsyH#&$L_?znpRgN zbFR$ByRkmBBF|}N-Ms=Mkrhtrm=Ipc#RwOUOos>#6idw8TQ0fem6yy*m%8Q&X$Sk3 z^kr$1rjB&~@Y(FtGTm#m7 zWG@$EhAGFG#-beKL7*!BClzS3fqK2K^-6cwFn?ut{`vFg?3Q_>Q@&9kXrU;i_&>#lIpgPIf*a>0Z=WLWk>exErj^ zp3{ytM<|PXa(txSY*PYkwL;d|wM=e`sc)B2R)kZ^p_(30iMm55Jq4dD#na1A_9l9< zPNtD}tNREKvQn%ufb*qYA}L++DIUQ9CfyJZZ_jbZrkUK7!M(V68&a_k-?sZxfpXkF zQasao&hv*qmC2TqFFP-FJ6t+=+crwst{i^B{KDBI6)ES*RK4XLy1)3q2fp6OWNV)i zdl*37=D!CoMJ6q2_=t^jBhIAE%cSAQ1Ab9Sg~R+tG6uz6Kv5MuyXVTG4RQ5iOg28~ zpc{Tns}+w#P(L+(Yc`ZWHaxj(PmQJu(>X_|wvZk>6^sP-70BCd4wqw4gI_oCur?mQ5;!1NY8zb%at5miiTU2%s_r|ySJQj zdy;wE<);S>j$j1(L;J9|W?72i;or_swqQ;#HX;^8A$od0Ot6I|T*cL392PTrK$)cy3^n|_iQ#3_H(Hd)JLgllC)SyadNIL=v z#OQLR&X557THqBghnz`r;0VYX8!+p%uwM%4PjCx_OOWxmhMSRV4vI%UvF;&Q>Lkp=+4#h|KJ?tPj z*jR55rYMmQH37N!2pJN&10s-IJo`<4rgJT#!GjwW{0sbho#*rYod@{qJDJY8S8eCt zc$^-2jc2({JpMTM^Mjoa0b&$i`V0O=?7<9To18P#s5w*0XHyA!3ZBhk1ZAYTE#sNV zOp4>&wT2|Ex(O$PGEyW%92gxQUrrkTT?p(-fwz~}vy;ECk zB@&K!G-9=9eHKW5=`=LUQLi;x3Yb)?=kZ$|nQY!2pD6l9%Gqqm8qRr~nM}r24+blj zjqB8EwN5we)u3FVwi0bthTN7goFM1n?>4xx1?xX=x&ik+LdBOmY0ZJw@`VUdV|lYUBRTo znGRYP7iZ6&mExX2UhPpJXUynHdie9|4?bA$yfffKEd~6O?MqeQBiWax+va4Pp0h;A zC^BN(`H)GACmC_zAs&JPT*C&FsT&+*^`Sni79yOr)d(qsO?A&#H%eL~OW+d{o_mm< zJ6^9JcFxZS_KmlW!MExy&7_0F*{CsGYI-wB#^=0#<#M4O?|e`3_Rdc-&GN2OrOb}e zm_3?zKj*lyfizvyS3O1BCWPs z$a-@@i+5-`9c<(fUPKe&Q~V_SH3jzaHtK+ekvV6xQ0^Qn@PfcL%GnwA`>@a?mPjr? zTBwYDB-2t+KJ1xF1smzAtHMEc@pk3BW_?f*=)1myUMV#pDnRt<2MD66SIcrb>|GQ0 zrzZDnecT=``pPrA=UlGI#mQWDbRcBiQ;LjaUB^ldZ=uDfN|}Js>oBLnu~a4!iKIfF zXdr3{q}_8iO*84u`03m!VQYIv5fQK$K?e5}>imdZ+)$)S` zp(`gqmL~l^=#^bCX{1r?G|7l#T#uCWDXtGPj#Nt!Dxie{37K52m+9^1Fr?IeJ99)^RJt?G#L`l@ zP#O%Q?CdZ3LaLbynRFIs*cHkdEH-UO<$}kz97BCswZRt*TXHndS;$RZ#O3!$pP5c_P~u2Op4P6zA=c%qOpqzWk{5sOW0&(o?| zzyjIPh3HDqM+!ujc`-%U(Y~q4V}RN$6q-yvt7@-}s@H~$v?^g>>$L?Z>~9K^Di?&o zNYqMABW=?e*t@NDe`}1URW7S%0N%*J=XrqBs$Y zYcy!0+Nj8mm&37#dL>@McC6LAIjE%bKvnN+rs_4@WZksnwbp>vYDpQ4M-49uFljx& zRs-O+gxUM$T$AAWQ0oP|Z3Q?*7r*2hF){Xoc2uqp6ZCr_WLO4FMr}+N>#q(YV!#OB zDyR#nRzXdH__wh(3`y#gq$2xIbVkI1QM6kZ>zZh(?Y3lElug#EYn%7bjh5?m0Au%f zx2=wZ&I`BI=|qq`d2o7#Y2>hXXn%6R-IfsjIAZPIc|JJ1!F5|fv;VwOY%R_!l9K)F zY1P_!4Z&TcUL{yKMO0%3*aLsNOtqwxs#{NP^}P1l$fOHxx}>YGtsqBhP3gS$w*ty; z+G>@O5&8*A)~!joH6^2G!<|pfuBXVZEkGpwpcl_&S@{fqH7L}xs;lB6#|wWEBD4hW zLT#4+W?dD&@~f3+q&>*Fl=DHzCz*n!&L|CM&V3~)JrF$ys}1oV6xV^!iDF3o&$0v8 z0GG7G-~c8GN+%LQM4}m4L92=?%J(b&-$xhz@?+DFB5k71zlefjqAx`VeOX{r#B=P7 z1{BG_GuvdVFdkuNLR1?`rV*(AkPucYlToMWkRA}HsM_dRsED(0N#B|NZu88U=69$5 z?#d&r*_qbiD=ATn>pQ=}nBzZv^g|zd^rvDCD2m5_h;awH&!rn+biOG_9;GPjodb>{h_HCd4yrlc`z`&O~Pj}9J$!z`- zM|`+E-bz@~Vmv21+}1m6gBVRz|66{r0QwO&lNATt2$Eui46(uq($&3?C=BOZp#K(h z2_p}Lb#X61KuV%ZRtb?hE`Uuo^l0iDm0qQHsZ<7w*Z%#5Pd_x(`NcrBXd8GJtVr0M z$Y`az87C5P49-kqo{wRkUUpO4==JpG3b@E~&AMIK>$Ta?5kjEkCbNdPkUIb7-qhDx z!4S3O{OKuSTdm<^V2_)wL$QRXekrSKW)<$f}j-oo2>53rfnf>Y`xAdA>L}O^Ps|;ul1mKLKD!L9tI)3 z9J;-m?QXl>F1gIenyHCS6;(VfIdMD(u=~i^g6;!}gk&~Kl$R)OQ`B?NbDd7;|A^ib z=6gy+aNtkZF%3(Me5CnD_n(RU@gL8><~5<44}Np|e>}N^-&CsmN}v2>DKK2(hv`|0 zG&elYkUs+azqIEW0{x-70`icWHhG@m3B>!o8&7|{ymPR~KTs`p4vRdbCgkEF>41oZ zK!qxbe53p$qDyW}0pSjS0C@oLp=&P`WJDwut;H&AEXpMfC1+s2I8Mnx@^#J!`$Yy1 zg1|MC#+4_g&+I7__MDl-A&$7D1*NmZ5rV)kuz2mFNePhxRI(2wEW zOEmDSto!H16Sm&Z9sxO+;CJ%3@&6?SrQ-^_;y%UCm9xrUsisx;s6GK7$4>SA>VMa? zG!JWjuDwZnzxET_U+Vn2?Yg^l59l7(OZvF}xc*-KCk!VHA2S{{{;er$dadb~=2w_M zG;qhjX9u?pzHRVnOW1Og6NATmcCpbDKD0vtY|C8D_^Vr?QmuI z-r@hK?XLY@{h@}vvA^-!k?hEOo6+X2t^BAodgtiZMt?Kr9s9!A5611|H%+jK6BCb3 zN_eW=O_Lv({KvMwU1{%b-!o;OIy>#2-aUPG`pKEr%$E`9|GGJ8?!Nh}=O13MFT8d! zzWDIcwM)-z3*x`_w*A{~-}cwre!4up{DJM^?Kf?|e>-JK)80yK`nQ=M-+INs*sqyK z@gKCKUq16LVRrlSnLk`W#f`A?nBsl-T8Dej`$t`{$5~nWGd4gkzKvzYb%~ABm44%| zWOecWDb$mtd)~zI(mU8u>7%$l1PhUmIi-KZ=hK_K{)I&qF&34U@Y~l|0kKC%*>BlV z{_n6%|CSxZi{s_MD`Mx~P(r58YRx}9mo>t^Pc;w;?%QoI*)r|<4(C2zj#QWJXdciCQc4p9Z?U`Kn3?Z>OYzR&jaE7@TwiAa((IA;TK z^q*t%>?^FHm}gb#3~F;BTUv6V0>X8OVfZ@wTE@K_U;9~A@lxE=V$=NNY+gDBlJcLZ zqxLJ*uRntIAHwT9ETAZ`0RJz%pT#Q$bK~1q(o&E)_?^s+d8YB*5@IE4(lqvNnzi|9 ztmiaqOEdWX&)77LkJl{wI`Z(p4r|!gnHlfzmIm;z&QJ`hQ625D1XNvKrNd=;KXTGR!rdiLx`Jx7<1{}dky+I1bd_r^D+Xq zj{=6k2mWqW<6mZT(lvnBcUg>o6Zg2;1fNFrFTfJH0WJ0jYvEeMwZ=Y#@2+4=1Y`a~ zz=FYV`6ztzNmc|-G!)-mS>eA$pWB&7I*Kvf==VMp_}_`SIMC)^mXP+c*^Mv$rwq?G z$FajcNV6-yf!#3&Sy!J|VpVKfO}E^6$Xrj0AJZ00zQ2!4BsfJ?AQk-{I8+k9ZGTfu$19g_j+EKm=ln z#b|xyQ4NA94*`Kdct_ye?{A$1tTWU5xnh3VIsbk3UTf{O*M9wWvemiIS?v@#TbzG( z7CZmwxb(^(GyTy-nPh%*)+E-20VkEZZ=es|h<{DThq7p=97e_veISDW=Q;D7LSoV1 zJ8!^>$)`8ZcS@W^P8oJu?yPVgcUC#o&c8Y}PObA>XM?lJX?9wjHm4mg>!jCoJGT?v z<~p}IZ#oY;-*sMc-lff6BnmIU&i~~6i}RMVnLnbn(D`@g6+AYc7W*Ch=wq?&)6S2b zUpv2Y{^ZnigF?UGX#{`J>MEy&ImUPxI@fRy_7qQA!aPdQ)5{IB#Bm-Bcc% z?k1*%-2}cIeMQ`aNWok;F%osVtJ_JDd~P5G9R_N2xTkvOmbR)f~kuf@z;l|sshO2Cft~s zMg;?DG`IID!#r~^OfgfVq!2shC4XD-WfD=&Ri!@ zM2XK247g(cZNGM-ErgmHpMjt>QmB5-e_SY`jxb-`VlcnNHr=wkc$KZxr#7paaM*q zI(_Q6+zfZjfAT4YEFs6(^!ivQncv$O$TvTWz5eg2s`AtF(~1|kF=^rF#&F+qEEOct z%E`1L|J$c-Oz_UCscC^gZWW~@U->jJ)jkingYepzV8AVs<9xMX?(=bh_(00@ag*c6 z&kKifjKL8+z%r-h6}f{Vw02Pd{rt`n7b#kp=Eg^g7ver~k>V86Mf30`vK3P=oiZ)2 zI4dQMa`Mz}gCkZJMfgQg1Mbfc7$fKo!nX$LUEZTB(kCcA4x|gFq@~WgQXW4o(a6Sza0j3)1=-?zN^plEwDh#+fsBY9N;S2?Yjho|2vxm@3Wl=!?1Yrq&OO85_)S zCtQAv-LE{Jc=@sA9(eVy@=T)2B;OC{%e4ELsqQG+{&WAu^8nr*Gj@zSnmnoLuH0mD zx|LjV5I-2*X95JIhxF?4xXEqm6H0YMo*pBFGyOt{K35rv9Fiz1I;i+>ZYo#BvQZJ zmo>aj8qUN9fjk1@fKoT6yW=hw5Y!KD3gxC-Y67VYGYpR>^25}0_nOPOzo;K9_cTi> z_m?cCtT&~**Iv$gvwpCwnU+%4FI!4kr>DE)FK4|)KUmf*ODSu%rIa-%9hlJ{;oO|d z(T&*jjYen3?78(ZG1c>$1~bT)1PCTk#)7oPZqiIT)|4W~#KO5(dVm|77JZ&Sa~T_a ze)uTi=yBk@=i;X%&YT_PS$u4;F~(c&#;>X$#6;#Z|K%~q$>U$HldHKQGrb|q(}Jb+;nby$%#pvbdBQ-9lenmW2(0g40<1cIo^ISm|?o z1T10xIm#(DEc4EgUdg;^6tkE?V2wSmHEi}S@?@)b3T&~Qt=?JE+r9H(o8@V@Cmr@_ zr+1R)U6$_V_eYOLsxx2)dX09nseLpODjo7pgJHvn*GD?)^?(KJu#84Ry<2Kn=3OAY zl13ekgja!*aI{lvpGv~f$fgon?TMrs?Q|G+8Fqt7P6~OFu+@8D(EA9?^p1hq_NnZa zgj5H?uweuXCn43lU>-J1a`LT&LhPJmvL!j?*dfVTZY8WRtU<>lXFV26a_Z11$!V~+ zny^xm(~N{kNGlm6XOhX8 zrxJOR%|6N4XBg=kES8LYl)o8yl4(KZZ?*hwhV9;Ao^*JJz%HyY!P<196UXz3Sg8UG z!cd%uBt2lJw*$<^G83^wD_FpMdLn;0@jO^WnG=!lL-20HQm=!wRnGin~1gl05)UW ziRk+=*y61OTk*GvXs7abnEY+%JJD&kS~~1WCv80uJ4m~3Zx3sm9MY4lA5F4;Gzm}m zkSB#mHOczUB(&=z-9-75s72{^beV)zPl8>f1K8?3SVEovZ=C_lEUms4ppDLg&Ab~h zIRm`qk(S4%TE9-E6^@h6q~26YI|G*RRw|{P0?Q~r)jTlOkq4$)UrxnhiKMITNev#A zYIUVzCB55Bze~kFM?guQiZ?1xr{(XaPko+Mm;Rzk9J);A6Rj~byxri<Bta8io>M69c{>u6qOK(M^DR}!Ha0eC+qT>f(3VH?6@c?); zz7(Vd6Toar4x(=pn2Uvj==%y7roRW#_XRK?j}1Drh%-TS-vZ9Y4}(~s6}*F13)0F$ zStE!wdcgZEe<|$}#3p*T+-g)?2eFK>8qW!0ALU<*{e#Za-s|9c%jx1LLFaiZd81*2 zx0xr6UNhKaX<002Jt#=8KS+8TEgr;fhrk{9LlEno1lzGm5bNy%k#H#)S+l(*@>PPW5sAejuKiflZEs8o4rP9qn9d zbjYA@egbNA$Y6Bn1?%kH279;B-fcq840O@EEsQ%ENUnD^mSxa4*^@=`3!uh`n~~}Q z7&eSh^36zf9#mw$nV!hsP{ES%v~()ol8JWPzzpimM8{EJHt%LSA@XOkUn7jri!+(- z2=j?}nY3m%c%S7g8@pT>eUv`D728Y^YevO7U}W+r;= z0k@%hCfcn9w`0{zyj1zyh}fC5(Q&ZDu+wVn!cQ{M_dK|h*goC*>~u6*Lpn$=n~pAR zU=I1GW0O;0*f2u-PRAz4!94oZbc>(U(MWkp@sR0gp|{Fu<>@w_PRBEqU-4%;dU4`~ z7AL{=mQ$n5baXinws^k=+p+U>cB_=X6AMgd*J=T9{Z64WcR@YPSiO0>(uV};fBR*j`=t>pEVztJSo z>>`W4rgGY_a2747bcdmQH5&``YEKZEvytrt7&eTMKN|^;g86uOHc|-{KeMgZWZQ_A zO7lIZ6jJXK6Z)pS}RjCz-;>d8L-9DivQWjqdc1DWFwET(`xLpw8pp`^Q9bG zs)lrs7?^`q-v={^Y&rCfvtYjW3vd>7<x>j2Wwcbxjukl_3H6zL)!fXaNn{3VA&q!~z+P7i<9Bd`o zG@s9*C%z8upf}}Ux2M2%`gIO=6Lxx=z%E9g9D1S)?xe@fz#Ba<6**^Mz5QS&bB7Ur?JSn?CF4L`|61`q5ee+VDj z1#0{aA7{5N!pEeGR*oTBtrzUJT6WUPVY6P?tQR)xg|Xfao@*u(#(LX8SubqXduy>aAh3WY{bj#*&g&mJFLE!&tJHv@97mONQyKdl=W_kS&7U_JW$j zM;JTe!EF3Lg7q$d^129CN(AR(pNNf95$w}Tx&&W}V4sU%DRDA_Wln>~v~rJ_H6mt>i1nigc6g8H&!ABRJ1CDV5HSlxuz+gR+9bjV$oT`B9tPX7 zVFXP-0J}_=os8yDwCe`d%cA(nS}=%zM$z{#U?x2xil&Fbe6J4ty1g}vm=iUvqxi`V z(%+)qs97LtBX!g)5XDdS@q7VVN3p~2!MlmlQRjQKP84rB1eSWg1G-QL|{*oL1+vE(~o2mTYqXC!kMv$ZHbqbEBV z3-YkuF)$yi=Arv3u*9C+O}pfw?{QE*kcW0>K+Wp&&}cBIy@)(?IS1C-Tbr$fW@2NW zd2$|Ys{9(G^N{3Yu**=ZvwT`p7$AQ>k|?eDYCa>&YA}~LoX`033aHgeJ|jyVm}hwk zh!6RUDer(~R>E3){^`E$x=>V7$mjo*vFhVYGrlT4xq> z>S16G^Z!}MZ~+VvMQ0&{Fv1u;3rX6*JlbUzCxOC7tjd`y^339dQ%_phbD4$iM?uv! zi`nCFu#2{y#kprZewoS`U4SQV0cC*##@-QNh#pZu{~iKH=(7d1m@psjEuf9s!BR$( z0(9>KSF$TtK#Pn8AG4Bc=|KfVm}6iIBYpw%*aWbHzF&YOi8}4YRb66Fg05ubsgXimsi>7mE!B()58O0nVc>$Dn%|RoTrq-N;g^z)< z@ErVH*kw<;@qt2GHWmyL!3xdW3u)gt(mCEA!CZ0{B6BMkCTMX>ndbbOU71F;hvcvLu>iRaV6AM;h|8H|1{@*$A z4%5E3Q&%iVYy;J&ZYR%h@NwGxc4|rBY&}TMdFBuEcq^7Pksj1r^X#p8_SQV!8pad7 zHJ|qC1A~Sc^zQlAQuERJDbl&L+I+Nr1q>T%?J%E~Qfcj$r-QLzK5eABw1@m1WKMvAkb^%L zAM9}U1yJ&rkY8!7j!VcdY^AOe>Qep=>|a7H9?XFy zc*R0u^?GnMabqE)^C@sUKD>~YItpV#>x;X1avJVJ3UV&O+s}ik=(Pw-_JY~Sum~Ay zLCLTP8U6%@nF%jq_IntNdOrvA?5zT{ScDDV1E02cwKK2?i=6};m{Bjn#}0x`#DqoI z>KLeb<|4FEPOX#|VKIFwrqLpz_c?eQL9BEik|-UbuKSQd7^SrPoM(~zK1w?QucI7Y z7NhS;a4VWFM#n?28B%z+6dn7(RC^Mn_EJXD3!vr~No&yW$Q)To>cGVg2 z_52R{SDATr8Bz2Q>804M%w{!Z7E8;J;R`%@jFW~k{QNw)-b$!r6fU!wOqtDO%Fyd= zo^)fkhj=T&c^HgyerULay~k6qZGvdD1bcRXAv9frC52IZW(jud11qu866XnIUP23g z1Zs!yf6;=cn1M~fO668gIpw@UIz;3tryQXoNjar;frYeGx$QiZI}53$oRZIhPvBSO zl&o@^khUCuI1RR7lSk-ZpMbLMBb5IPn2S`8P|Leum|4~%w7Z@}nY}zhyPpRi$J!P6 z(kU>2pH$FZ=fI#nQJ<}#%!{DTUn(f`Bp9-E*igNuf-*b6Jmjgsm(GBNR)R*i3L7IT z=r1b2(LR+&RoGZif&Epx#)1m`st4@AlPmBmr8T}+&^qUxrO5DSFhs9hibldHv!G?j ze;!Q5=F6;SEhFbv(jlZ;MowXbGMABm3n)34F@Bu`8;t=qKg*Ek5bP+~d^z?JY7AX&eQi1QzD7Fiy$VLK-g4@F9?YZs<=AI8ScvtO z6IJv?vz_JG=Pj_2Sh^f}UIaBlEk}maV29=DB3+55e*_gnDyjEHP&1rLY7}b!vyvK{ z!91c+rOh!a@xva{YmmGWP0xc{i3XL}|2Qc7R}x!P!VXJo)>lcr%HPRsq!Qhg?&hr( z=$z`4YbD#{l= zV0kL+`EuT>q84E_QKgDngikY*tfCg3Xu6heFl;nzBLCz33&4%bphv8-{litXMI-54 z#;;YhNG}*R)OqnLqS;wcd%vrYCkE8c{3`3|tB7U?Nte?1SJ7S`xYW{>c*`mx*hiqw zR#qXEO3*&!Dwt|Q#p+df&N;A&7_!R7?rI|NKC}uTPc`wU5zIiIYNQCaaO~IH)y6H4^IiT6$SEUM*CMS0md| zu+dO+_-fWcDy;?GtMR%%P^;r=JWV+@Nv1*K<7%wO)mV?KL5n}|sd`)ux*P)wiL^EJwKHG?GS?tgFW6*H)Yoc|M4#%cyaq|m zz^}|w;`#D8kd=Cu|vYHg-nYx9s=blJ@MMjRO>2KJMLF7Y*tQy+s(*m(_>IRm!Pvz|etOYmA#$+M0c z6Tl4etYcOm59Z(%+L1~G!-f(1npW6Com;KL1CN7ReXJt}=&dUH={m-Gz4f@|thGFv z?XRQWVW9T?)?tT}UhZ}B!Js|Kp!Ry|Itu16YSdGgo`l#ZtfwxaPHO6@>m^X0Sx+=O z2$m2->S+#>+}cJuCYM6(ajN^6RZh7D-3ju9n@1sbqeADB-hY(T0uuoTG~kV?x1dUHWDjZ=Si=0Rk@Eixs{BSG;Zabv zG*Zi8uolT1spS!{nO1J3mZ#u!$6@&&vLoC9amznZA!1+bLW zeUsJF#5(8%>2g-JP1M*2s>UX(v5A$@aniN)`X=gK0X7rUny8n4h zeVa{4B2IUZS;r=1=ms^WbDn?&HsJ$j!7%-I6F#sP6i;arKJXE!bE{2AdkT~%Y(m;y z;8J!`HnEe|3s$1bCbPySqSgh{b@T#QK32@hZIfDfr}8BzXtS#EUrXu_t-t-0FN6J8xy(83Qi1Cu*0iw9A{I*b!Ta zgh#RhmwMZ&@eruf zDDBlHfMQa$Q@fsMBx=Xb2f(Gs(~gA?gW5-JXZ9EauD6_Z_-#AhuD4pSNr%Om4wI?_ zsa&1}={4N{L5mJ#dk<6}>_Ebep!QWb$1sc#1KGF6J{=}u2NL#@7PqIvBJ_jJN{{V?pg^bl|0LfI2DbK*HA;7sYMsw9|)9WY|PH7kN09LW@o$ z=>?<6+)3?cLDk-AHFi?tLDK4joz%MztVHHctGCnU?VZ;5yR3D(u)|r-;{&u~m$gwB z*4Ry2ZPaCU=t2fY0%|`7h7BY3saBm`*x>*uJFw$R8+Boab6_DB>oTdjkZK?4rIu4I z)n)Q@VFBf-BdTU#Sg*r^!tGPbS&ws`_pmkM@;BX$A2o%Aa291?th-} zspnVI{=MuU7ju*5PUi=F{}Dgk>D`WtP7CS=$I69nMSc%i@rw70< z^Z6ose=!n#k$(@Oo8(-~(+7E1b>7SO`+0gdpZ`75-%4My|A;XBG2{Q_zxN;-$C68H zwO6?9^bWSEX08{J&p5ld8TBsvFq6@IH_WjqXt#qH_NsFzCeChd1+iI%-Bo&>TUt}8 zx7D=$JbK>5`t(iiSlvy0`B&z_8<8=d1YbPAr+g-dh5#|0C_4G5cG>YW@WGKTmT*>zCXX``_I1dXzc+aK@QY zca?0!ESG9hhMAzN|>JGIqCfu_E2tjjrDSjQZjDp`)rsHI90F)O*}iUo?8j=zXIPk6FlV_5V3$ z@t9wZd3wx&u_MR+cKaHae3pO9M>?e`I?)qDZl2& z*Brcd>a}0H_Q&Jn#}DP-$nkmOA0K}pVGxs*jiSt&)~Ur z^wkY`;&b@A{Hu|fG&5N9=WX=G?bctf+=$$XSLz;tZV~7Xfo>4!{y>CrNqa%MIUsh7 zZVl+pfNl)vzJP8EjOR_5mqd5%xQZ(#rkL&sXy&c^0VVi~c42fgK=XewmBqN%4ve@~ zx(%Sa0NTOSJpgeObq7GZ8e(y1Uqk#v{_-O!G5@uLsj~=i{>Av$%2I59jq76ii!G@g zADwZD;qTYR44vA#EeENE6MOa+#N8Kj zU-K5#B+kA#nPN+ek14LcnEIN_i={9Ar5O4HHHw=r_MLPZV{;d=^2Pbo97ue8vE0SQ z*DToAVHhP}z+y)!?Gr3^934(lBC|BccI|nJb01^&OJ}BXm{!rQ_=}X^gEl+RhO=qT z9W^)9%uoz_@$1E|7q?z@idQdIy*Tw^)Qe9qHoaDhV$y3yCKkPTV`9*YGbZ-Dxbr&k z5lc*bMsen~MfH`RPtdxB5m#gDNzc>*i1L!!e-bP$P-A<=21c?(IlQ2QZv zN1tT>?kDWq$(w&d40w{(SdA2iY2UN9Dr)63vB||H7n58(@&r7Gy;0Ur+7T6ld^@cy z_V_ep`+%MXYZ-0D8yAx`oA<>S7hhbb#A08FDX!fGvBbp@7eie9aP2`C^X1FU8Km{X z6Ug3+H51I5w!=#chzBkfxH#b2g%~C?u#rziUTdZ&CBfk;fTWoJ}y~XtQ`_~@y z+SPB}9>#v1-uQ9i06qoV6rT{QTbypK9Q`<1wm8^gV2gh(_O-azVqS}PE!MR-*J50YZ>=_Lrv1dU7SCENYjLc_ zu+~nv&Wv@&E@rjPy~L_!=1!}NQ!Pfd_|!T{7nfR0YVFR6MJ*1s-y=Dl#pX-MqkTp{ z_8sr<4MUKE*urOiY&nk5s@vufB z?KAXpj9SZk{`h$YeJ)x|P>k|Ngu}E6D^=P_@ru8wV(n2wjoQJ3X-{ABBh@eHW9RUr z5%jT_jfE@@vKYwXAB%l_ANq)SEZ(tL$Ko7|aV);E*v8@-i)k#Lu~^397>i--j}v42 z$BEzIQ9H29Pw}YNu#LtF^}T~=@iY3~EEAS=Wuvo+5 z42vOmdo_X&EPqhyUH{MHv*XO~4q?X!x_tLP{uub8M}@ruJME~WUpV(*H(t4JuesUHbj zX{mQ7->iXXU#%rDBwdnJYG_Sh?clijgZmt|FzlxMJe! zl~(aK1Pe~{upoqZ8SFbqR}y0XAkSSzt(C;zgF8WYb9>2uh|eZ zd-t+tI&Bo2_KJ2deM&p+m=0*StzSD%%>RRS*M3Sn%~4t`k|_#^A1iLCxUs%=ul*O= zz56Nc*suANb{hK?G4}S4`|)T6qY!^lJBjfszN_MoxUOQlisveptN4v#xQgE@cB{Cp zVz&A-y#cA^HSZalRs75=(y}j#$B4ly{;Jrk;;xFhD&A@~QfW8n6MS_op7a6|{sm8Z z5$O&iU7hh%#ZvXXX@~JseQEt@DPF2rsp6!Hkt#l_*r?*7iis*7s#vHMw6GYc;-89r zD(5Vn zY*KMa#UvGvGzqO>SE8jjq+*bYKdN&!*;dR^%>b^kJzGO^C`NBC+f$^k16?M zN=dt4tWK3AMyL3k zT3c&o`#airi^(e;*$7wg6~ediH9i`rcU0(z!d*d z=bvklLCi}(;`U*)UTmhl{XbFq3)VW?A^f!M#IO{P%Yu{o>4sNhuzsb{%!9Dh8!SV4c`$HYet!c#~pH#v5x=oJp~%#FtFOieiZKJEp0_ z_oLx_GK6vxKyf5}TZ_>i_nBP7EY}3QsSgWrhYvsXt@ISKYOL1`_Z6&k0a-UY4&EaFju*o)#Win%D>qF9UKEXHEZGyHVg#$E0iQ@_}X zn!|{xD1L)q`k&D6W%Pp`4?9uZL@^V^OB5?nyZB-xijOEZqPU1UTh*v27NS3&Jc2aG zY4vmFktZl!mg8OqUt%3TOYJRa8IP=-=u@89hT_#WmpI{hAD~tIj-k(^1I{6UePkcYkTE+Df(@#7_y1{YK|Sr)d?l!HESY4qO7Vavzc}wUgLy;=bwhe-Iuij=ENniFjG8&HHpOU=;ftvHgBJ*qCnO zxryZ_j++>6;gVXo`|#3B^bGMSbhlW$Q-`RPn{bpW&Y2iz z;+yGgRa~^ea`z0{)}Rr%H#d`mlyXRxQ(VFUe4 z=kR(xM#0OJc&~LX8AI$Ho8s&SCK%@M?Y)GR#V=a+W+%JEW|A4Y~VsFic&e;g> z$N0TSv){`1`|Dw(I)_x686BZ7Db63oKTp#7;&u7a=w)&x#?Fk2uV@QJuuVrq$}C6<;>#{HS2X5iYL z9!=a$#P75Ncf5c0FpL?aq&|t%I!)H>fm2P&9YyI!vCU>AK8nOIAaMiIifhz|JucBA zKf(s$K(9c;J^d}O5#?=4dxMhRL`JQ#wf7;0mG(}>t`fKEYRZ=f{Ot%UCY5+pVo`}h zB?eW1Ry;y0vO`Jl7k5g`De8_xKUz8 zi5I24L2;t|QCq9PBWR9*R7h(gY zi>uMy-&$L+FSjf4NimW9(-7@KoS{}}FB|WorgvCF!Fom#$?flRy-7`)<+UOEz-&fL zBc1JwW#rGc-=_4pC|&bNe)lZj#VZo4NO4bNw$325uh`1Zek6b?!Oz-5SG(v$QXC>N zh{PWfdq~_No#l%+B-W5PL%vJUaWB%`3LqzPxR|><d`!CB-S068~ZF$ad|X<5s$~WC^xW(`Qq=0 zz2jT*%6$1+JYc`Ikr+GT>xc;=u8x>G;^~N`BaV(3I@&cFIDygV;YXhX==>2n!+)jM zi;W{Lj+i*&;fRHkV*Nm#;P3G6!V^4ddavKtHd5Qb4&n#Y_D+9oy1mEEJFMtiS?5c8 zsck>C9ip}))D}x^+J%0D+O$9Qn#HtJjC`6wZKAzAO4oc+4D49I&m_V4TWG4&5ILeEn=cb?Hwj2D0BR=dnSl*Fw7EFhN42;|~7&+t@h z1o2z^S+HiInmxaTOs9BTqvTPmS2ItoDz#3H;e7jVoQ>am&)voJuq$WdIuDQGNepZU peILZ!Vk|S`>x}CW$9eAxSO)rD&B<>p-+u_MfLRdBlNkP${a+P*)#d;I diff --git a/www/bootstrap-3.3.1/css/fonts/RalewayBold.ttf b/www/bootstrap-3.3.1/css/fonts/RalewayBold.ttf deleted file mode 100644 index adc44af0b26250094fc8936f1778910969a0ab33..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 62224 zcmd442Y8%Ul{bFxJH2Q|(|hkt8fiuvm60@(Wy_M{-tEM3w~3wDF)^{z8-_Rm0&xl< zKmshVEXAQOZK+vc!?Hjq8|soQ%P#OO%PxFC;?e(i?mHumWXX2;zW?)lPDV4*yzjmD zoO|x+=e&$F#w_@uWbG4c*KAnvn_vH#vG1H@EEJvCuxaea{+~t|``zQX>V`ENI=k;z zzCzE~W8?UJ*WPP)9}9f3{!9G+F2!r0@# zWlS@9aQ7>Z;qUDjpWd|xkDNMi=DxRXVvPG4d+?4!`*-hq@sn2{XY66j&w3Bx51MU? z&tm*Aevcoz_J)(+cZCA@{v2b9V~6)2zs_-^?LRQzKQWel`pD6}7+|=@*xAou%uijr z`{XhHCC%^gJFP!_-R^7mN6rr7+HXFJ?>~C%=qqpd=VP8}#=dn0)*m@`eE+dqu6^iw zj910=yBTMl(j@!2^c+(#cTK5~xHeZaawf4LzBjR$bZ#(bOI1p*-rReuH0iw&e^uaH zCOxTmkZG76*NoMyxU@~L!|xikiU!eOl(f+xF_o4pF)vdwRRtR$aizqh3M5zK{xAHui>$%ImeU&A zj0@M0v$UH{22B3)mr*IXG%3xzm7Kq3_chBmZJJw*gbaY*ib{FdU}K~c&HI5Gfz#JDaB5{6Yhkn5U|`H_HCrw129v=wA3h^y$P-*V zqTwooRelC)9>+-3w&Qf=8PdPacJzwt0=X>b2+v0Lr z+CA=xTH6wMt2aRl9){PK1zF za$u9Q6reXrF$M9FCDs$YUBh)Zd3iAKN;&PL_Sd%?*PGuOQVtU4yX01ye;N6f7;}U@;7~?n9US1ZFuI-(i!RN zn7*f`k4HT&bDLVJ#F}HlfDS~hc77rt+?0A!)q6eQ5RO?9|QMy7-~d+xHD`UOpMj zxDDB5o3fo-#?nS_CNP>F$~tQY@5c0znW}Uj);Y%hSZl8h5A@|Sk&xR-=L#5}K4)CJ zwYI$2>GLX;iZ-rN_HwQ=;ym&(4!#cwtK>{o5Tv05JQ+ZMjYt6=0L7S^ODU#SThuX) zZ~9yagRQvuU`iG5xvbG@%U;$%SPCsB-LgJKOucOz$U+t5jlGYmHI)uU&(f$j^I=@u z;B6@$F?RdB!GO!rY0NLbVSUF%HpN^XyCUhwH4oD+O)D~sbGRHT z#}+}<$@bn^JV=5+ybt`r$ULm8W@5}~w^{I;LBUBL_&|VIJxKw<2#6_wK1uOYV#`Yn zCIEh56Fk5|JYb4TTkhVP@4E8NwcqjguIWB`vb3hhFFoD2>(0q_cVAWF`%0UKqxF1z zWHZL)Vht6n!N5jH55zmP32lomngAnHLPH_#2uvGFieOB{rEobd4xEV;(S!qR$szwI zRq8hWLjB!5SO4y*Q_|C?{^r=<;!2!3;)xaLzY1n%t7>+oQfXG2AqpF_DkLo+@4{vS z^a$NRy01#D#AM=J(v*^9jB29=5+mhD{IaDVMs6ogLY9C_pO)Q-(IHR?>cs=(IR) z@tCAmNfFqClAc39P+;jguGI48k!Y2_YBgX>0UDb|oCw>n0*t;Xel-zI%aYgXAieCjk?%7st5zGC1*HtaA2=*%`g8ZYE zeXBYe(%F;i4^4&~Q@zV(<#TFmYxk7fKS^g_<~1qolaBS)+VK}1o8>fQ2L-W}4G>AK zATlM+r{aQG8!S&|FqSF)))B5|fha509VRRx0hddFAdiv4h?nmHb4vKiE5& z-?QcooF8Aisk;B3iOD;6_ivoIqNgu8wz=57rIy&;y}$mTfSvg2+XWvlEzZY14UGf@ z1d389j8S6d;N3#~wZtq~h6OZlk=}l9{c~r|@G(-nd1w7w($nxAgyj8W&q`mxK@QEg z;o8JTks$|OOm2@7Mw&V!edYWh?Ym*-_xuC6&&molt;MX@fsV1?0er=+99|7lBO&4d zf_x;Ml8|r}nNoW&7-_xHRMs?>%XWLUXDpRNTesKVsCNgd+p7Ff{n2%=-dWC*xBwow zNyrxsW;4RGq{e!o&yn8hQIQXYM{pe!10pV%TXXWXWFZgA)R`E$O|W*77#MTre=uf7 zjHzcu8nbD=)0ln|mk>`E9afeFQ)hnGa9+^hGUtafGxNVOezL*u4Q#09ZSZ@87E-a5 z&l4B(!8n9X3j!6)KtQ3Ep`e{4%qto^ed^4Q$$3DN2^LQHG2@136=#KP5%>Y^&*4V{ z3+bYOfFDnt`3f2KH0oL6!1B3%kDxtRwHO~dgcfX95?YK~uT$exGajKcZH&UlB}r|v zRZENIB^{3`G>)k=y!3|pZ+YZRKfhY~3RH(3^{>=V@S%g>!-(=6!f_k7eGARW`t#$MWje89!`6H)r6~^gjzhm#=_X6hZd>VG+TVgt-^x++@7_w|w zoRC@pLi?}#-6N04V}QmKF094KDuRz08PpfjnG_Q7v5-y)#g)*A9{{|E)&xFA22(?K zi$HZ%(0TLml0|ymC#FAf=IpnheUN{z{tmvgp2dkf!q1)`zyj!8KZUt;EL9VVSrcjp zNDeEG(5WLjo;}Mp8kYmJv1iX5=Eu(*<9}c8$A}<XY#O>;u*Pu_t!$F@1?huncW5^KmCuqoHlW#zy z;~H$NMmQL>YCSAtEsV3wJRnKgoC8v^q~+cK|J4_<-&;|muq|!NORzCtl)ePnVuOT$ zuFhFJ>UA4*%*Ji9uC5@@O+$LfdOH?QB7g*!YL@?#*$$j&zSDNZ9PIi0!rOA%sWXY=<+JD#h#9jLaM-JSzY~s$ngZxm(=CO2U zd{Z9psmwBX%7JsNQyIWI{jA8Iss)4aho_T)Vz7w6$XXGU3=6a(iNgyzeNMg^C@y+>;O|uAuQ7!MW;PWn)gFV!)Ql^tZ zzqw86Qn}=_otkf%G<8U!F%T?JF*$%CPYu~4M4YnRUt-@MfvCCrl6x;qmqSemEsLJ}_lw_rMjcFqzac0%?Kc1f+qsZ8lXmo}yB zqiV>?OYPK;AW0v)G;l)BzVxq`16y;i&I+C)=nb4MJ;zsw6Q^=n2swxnC0D|Nx`4+3 zGU72rZ>B+%L^*B$Y6}8Zdz0c%gN7vU^GQq@BUGKY3%(&!30ajwPn_>agC8AEG`P^or9QaM$E2sRzqta$#{c36hkJavpjno=(zkF1T&%$Uu4eVP6EVNfUGNlK zPLr|WgVw?J>rYE8Z#}t1>(7FcE0AZ5fZpn{K_!~S1i?CNtIjzFHO@`iY2#|TKQoiyZ`PVmNJL$ z&L^5G3q)_x;~(BPr?-sX+;#m4&#CTFI1O4vZ$npn9rn?T6C*s4eyT?ZK<5HGOxH;tC=LGJTGAG*gBXLHKFCFh9W1$TuzY z9WW-iZ|Jj72*AxQ?^-9K`m_(6VkU??1|?TeAv3aMsuF}lhp00(=i%qS(#}+N{rRc0<2bZT9H}e_gVthfY@XmYv=9c zH3VJ4zJu2nM^-~Yday7$y@K=4o?0#rXy7H#6)OFI+chsM>hBIQ9e}T1eHUjiLPZC%e}GbSFPW4<5c8~B{Oy+UE7f7*VG@Lykl42 z;O;w?)91p58bp>P&n@)M0P82M)9tdh8}!P6Dj;i}kyfpfg2TkWD26G*AdP67&^H%f z&zqrT-g&{AgjV_UB^NfgE;S3YDru5Fuft|)(}cBQS(A(}&?J{yT2qHybag+JHOGw? zuCL)6Ke*%)L4RW38v0>`O*XYdzt3qmo3s&KWTAE#!w$A+hva`YMoA$A)lrzwrWO`k z(=V=Abj?43Hu&g;3zi+_S1-NZCQi?S&ct3*q(DA_7}M#nYY*3ddc(~(-%$VALto!2efd|vs(5E&Mg-zj28F>#0L^ADF+yJTrfgqLKr75EXW) z=FMg}D|KZm*-9)D47i=(cRH5lX+2wm^lb)ds*1w z|0UDod>jq48)X~~^e=^@4Z}m#!9Lah8)#C*=n_~k0`4;QXLr{>Kp7ETpWMxps~%1lGkGA&1^6!bUFl;;XzqQX>CnPGs={v z`->^98NPTqINSh%{PGYeCuoALDVTTW4~mDtn+Diwwu#+VORiZ{9pr4yrZt;3teaXn zxVpN!++E0}lA!=)tAJAt@BuTOPM;GT$k7hr+{O)j1y|`tdyAb)wF=mSnxW!4D6S@M zKn4R+X;}sq3^`g;BvcZu4&ryISTvoV+EX#OwV`6v znhJ-js|LFQX`d0SPixaDtu}bbb;SR^SDl)wF2w`;`<6Q2YX=AZAK`(dV7(lw9E9dI zi?Yj+5R#l?3mj!2FTW~%6J}4D)z}j?XD-Xw$WXSNE8}mOMBL*7$0HBE8+Pb$9}+56 zg?u^^7GWmDwBgF1^DIDOlWc^e4RnUw8QBpc{|Zs*s|_v~02#>(2OyD89*VZv`*CSOH zrzgkPEMGHLt1c>!>BL`kDPC!SabciSKc}UbxL&U%fqW^JssGDa<`U__FNatI3sZ?- z9_98dmUoO?Tiz+f=Gzq%^AmOj(WlUo@zw`oGBV*oKupvI#XtS@v9DbBhBrY&d!+sf zo^0fJ^df_rK?M&ZPHqZ^d>*I0-E7dQmBL#NT{XzS=rAx+wPAuFcTMaCDdY&wDCj*- z7F1iLGuzO6ZsTXv)Ld=2)n$;qyvK@(b zdwaXB9aCYyOZ*o+A$ z>!fNzwbHtxvs~zqv=h#O(5h9T0p~s3WDFV_CwuK#J|5Xcec3|JGooiOD zTrpfNcW01S?DGiew1sa$2GR66Cpg2NBv+~uNOuWvz2Zu4(3`p1FvYcenj`)iLA?so zs3<22-ZYU3L!T5(k5n@Hq(zDjs5#9H2H=!};@nA5l-XZ+Oy{fZ`oA^_kR;69<{YqT z;1Saak66RuLmMTyO|t3J7g0f3wGT?r?HgI#uaKT{B>I2TY;#`f9c>W^UK`I>J`B zeWE)(JQ>~PN{6kP{t@T+tG09%H=S6%?8KIm!&0`}D|_$Txb?oPyU)* zDbZ%We!PXfv6k%@y55HMtFM@xpx8j)mi{e^NmC0b^6E=*Fr&U*(khJLSS>t^>2wBc z4YVA?d;4KI(ONlQc>BvyrN-ho;JJ81QF zHK)_TSvcrOIa5aAA!T-MpOwsANY#TUSAw^n3#lwgK%k0#lP$ESFy=_TA#sYpItnjl z?*TJIy3&GsM9iysBY8`kVps)rkldk`rmkp`QsgRXoDfG)!4Fh-`c9no@2HkG4Mh@T z+qZ>#QVx5fJ6M>oX?)SNzPA&w)xTHl$xrR8^zWI>9`|JX!r_6ucQALWJ?tVH;s(Q0@>KS{? zWQy6pf7odKqc@@4X|y{Hzp)t(i&?UO#W)`pBx+afVYR#~-eR)alg zQNOujgS?YY9X8m0V{qDyJCzCVAFam2-<4LzI21|HKPjJ$JK{=0KS)9N{U<(CtECmj z!{@)=#N!Xxzg}W)=mbc4ljp|xBygH@)5Jg$<_12oCQ$+)&rNqU=0{xo93iJH3Iq*h9#Y0yv@CrLj9QP7)6U*jSUK9`BYgYEvL zlk{SXKjm;H{q20GGZ|=a58$uzyO_rhJ{N*r9HIIjRNFb)42}99ujhjLA4iMd$+@up z2eyF;iBBY$8)j>VKxCGGtJLjfhY~9(Rq#qKRo6MJ5wVk0z;6@^jh4 z)y6M-B&>s0l3ut%33it_2b3c#ioO;W{w&1#{JNi?&y}iV2d^59EwLG%Yo;BG)Uj+( zc24aqFSbFwlbR^p#d4_+&O~PBwNgQPH47u7YFKcCFbju*6cHeQc3P;FNw3H0KsZnb zM@j@*``qyqRMkiaR*{1Px&dWl207B&c?xn)ihq~Ol-mXTO!Xls9U#qsc6 zrVg*KM|-!qJY4g>-QN|0ondBfI>@QM5FT=Ip0Q@~Yc0F>+H3i% z9(bUB=79&q84J(6fqjTQfEY!-hIC&lMWftkKPZz*orK*^Ob7%EK1FYWKe)Q#ur7(X za9HEL&Y$gefkEH>mSD=Q!_^9wpZSv_jJP%BD^9arlsDqAb2dIU06$B5Ix`&#*i(*_ zoWV$*=7EV7y*==-^JWep9SaQtV-lS0_}G$rq=Od=>qEhWoNohuwJ`Z;PV11*eWl?W zkn0f^kfwsaW8J;``ug_WyKepc2L=WX+`oSLjoZ4rww_$E{KTfN;^q^p`>q;GghqA_ zuRZR&%Ut$&vjMX`oOT4trn`*k{*{`_?t50Rx@T9Vvg@8ztMA!e=`L(IzI^QZjm6@| z>&NJQGEv)7Dr{bsUOt!(x$Mz`C)gRX1idM5XWR+I2EglfL#Oj2i|OH-I~V|bi9lzt z)8(*PQ3$VNe(u*bwTcqFod7~osJ(W?V-yV)O}2}`fE`gS<=7LFlp64QS+5(IcNgV9 zDby;pLe+z9hEmviH&w;7+$?-7b2xUAB19n!^=t%#js^MrWOQ>!?~buVYepCSWrL---I?mqXQ%e|_wSj?_7!;c{O2ifq2b{`yt{O~%^kMg znji2M211d(EV83V0 zj6Yc%AZO5X4=eJoN-=Q;4eZv7=E%#IZyad~Tm{8jXcC%+xJ3*vcTouaVv z0VImR;374s)_;kc;Za%QUSUjkC{m6_W{C!&Lhw=~m$-Twi6spdtAJAL=p}DmkD8xX zM+&_G52cu-mTm2-t~lL0q)qiLizg_*BsR3Mt2%l#dsAQcHUC{K?n0u8-Ce!a*tDXpo5l?V2#3jR7IQ2RR+{Jv<+^bRs8s{r(iCPza^rsStc4@Z4K*ii12zIVJ_akF;TG z{{SshMd}zNEJ%Zl0SF!W>^4lR3$rWLnmHGIBb!jeiz855k}D6^YWpV=aI7CzxRXV% z>{u_VR#kkRahIgeP3`IJ+dG|y&%CFt#b?f|gA=xBF#w2V7^tsE6jF0b%^i!Wl(Aea z2ae=(IgyVXRYesNxKXVFbyb2uMV_P-(Q?QrC8Fv82I@4KnUEKx-U1>SIt@8+=ISNq zXT2^8)jGuSZo3@FsKv>7|0Tg|flrN`(GIq~=1wNHnq)^3PPTB+>p`w^LYt7_pMq3s zW|)u({jx!9=AFz6pM~L*=H8u^LvWif3r@N7$oVHP4Jv%i@?L%iP$Pp1+~9C6nM%nS z%&E>)C*@}QyvSot>XNOQDki`_6pu+HkK4EoN%=Z8wpA2(3jT$Sr5)C45u&HuX6&$r z1a-;?1J|h(f!^61mP^9_2*PI%Ul#D96Uq6hsVP@08F;8n2w#NFhS0n3>qw({t5|4AdffvYcDKA(Pp-JlB(SWJ0#rI-+@(J0G<> zq6L>b7q$Py8i-k~@qo3O$qatGdo5&qb$wT`lnv{xD|3|Q?CG8?=B6x$NUrSiqf zd1}iRT!&g?$d_^GiL~cqH6!hIIApi#wPek7#G+JV!* zQy5|{O}%NJJ6({)niTdwRdTwJuHM{cdHbcdiP~^>>Oi%B?_@SPy0yD!yWfya>`ZP9 zukL<-cVE#&A?=u|cO*w|gS(32{c? z8wR&~0n)vP?W={8$z)Hmr`RD^WQT$QoDr7;HGo?3N0OwgS}E5cZ$mAh6oF$v!F8~j z8rw4KngQGfLqnlK$|faGV2=oJo7kcSpn@v~I2AQF{u3o2v#?_W8zB2PR?2$|y`B}3 zt{nHCJ_~ffxSNB%72tSapECel)X|rwfsSvMFNA;Qj|$rRAvVo}we;{XXT#IO(<@i> zRm$DDOakq5W=ruvn?^kw;zNkdOrNvDDi}wJoo*Z%B`Evn1~@7Wtf$=sT%l%9VW3li zxC}>hE(J0GPTJZUbb%yzr5Ru2h>*uBfU&0L#$rZ=L18rXz zk*u?0j>2PwD=NYEws7Rg*7|*Vhs6LN;t`xs4gY>gWwo~}wW?A)O>%<@pwDBkeQdmD z6g4-A|U0ajefTqE4F5osQRhvpKM{A*E!EWYg7!(_*tSR+ho$d9mh!=9) zbNa#4#CdY7`=bf}K9_%%Flk+=TR4k#b+O;noL$92E*_On9{OT9EoQY6nU;+j1|8Re z%CrnN9tlTnlOUjDkpt8Y_A87|6^M!m6b&dY;|6Ro-9S{>DH5)A+8%_HF;7XJN4Mxa zvZtgpcZX7;RW5l4G(!}B$*SNsK~M>~x739+)nMXicGe^$=`84>;0(1;&(^J=of{4w zKcXg@L3=iCpS&~d zZUBJ*v%g@HasUW1q`%5j>D!rA6BZj6# zJkq^+B$i&Wt8ewq;Z=bRh2G_(-I0FF39ZqjwL1CE^L}FoABj{qmU_32#K!v9raDG@ z%eA0aks6v#U3vVbx3{$;m%1|ZC;lesAF)OadNZncTP~&JE*<|G_j2V>{nzzBbn;2Q zxwrng`a4PPIcDyZT)=@IZ0Oxo4T$_@Jrh~Ql$j)|0jY8(*#__cD15~z@Zc3STrf$B2R`iy^Vd)ylpLF0OShbsa5@C0lNwS>lb}Sv`>+l;Kl%7hdXt#`hz> z`pT_a>p%Ly?GN3^KUm*z@*&>#bApZc^4p;M5p1W<+pd*euz@t+{ z-UU;$@HEy_K_5xXnkx1D?#F-V9UA)SgS>ag>K9*Jz2mPR!+gP+h%^LWMx0f68CG%v zEk_H9O0p6V)eZ1w#CaUnlYEYc$h!zLN~Mm1$)Fh_0-lI;%%*CB=(J^o~C{U9I*<55W z%1N7(E+U%%9;`+ak;b8+NUaH(-wXVvy7HFcXuP(q7b%h_a;vWy*>WN~8Qf70_2)d^ zomyu);?-EM$c9RB8{DUg?BuRqa-UW@uB^8WTv?0umnRZgOB@Ya3SEay?y&XNjy@k; zsA1tk1&^qr2ap9lfXeLVT6?*KUVzw3laW%!#Mwvzf4MxJefX4dJso>eO(8WJCCn5b zp-eovg_Ez=dC{vI3=(puQQRV2$rZpYS2-f`J6G2SRY_orY)+HZsG!ySAyiH}Y@w{v zZi{EyU4ElGY}ei%9bDI$U0DvA+#&1eROjjgeJ9#{X}>q^H=WEx9Da+&7KmHwZIV8_ zq7-mthmzi6DxkI=SlPd>3=;{kRc8K`{}{d9;QFkgXC8PtByj5{W!T(pvswT-(NUHMQ0V*KS+RmT+iXj)Fu#6A7+)>s#x8Lb`$WZEr)x zM)Z8zQbhmfwH+)O821z4o)C z@*CESb@03x18auy&|Jgp?2TCoKFr5Qo7c{RZ*<=1bS?ayQVhJs#VR%Q1*NnxDpe<| zGKOY#O6YrJPNHFD6sLzM07uUOKd8(np#(>;d2j__->{9d86Z;ZbVt^jjt4cTPY3o^ zOSQO(Cx-{y18H~tACc$rtx_d6Fhy=%xo409%^vpYFycBtirM*r>?Z=)vw0h(YSTshsH(U8uX15U3BG&8;}za z!6UdvpvN2q1Ew}G!c?R_3_!?}aAbb*wD3|UWp6Q1KJx+q_h4K#xH@|Kpa+~@18F5^ zDEejZN)n37OK8q_+ObHE7hRHMA`NoM2O-J1diqQ7gbDPE2ENkFYi6oqObaaQlQp{)Jyxv_D{O0{L90fOaEstx)EqMh zqnZRC$d#BBtP4tX!d!x93nvTAdh`_+xlZVH+q{~QEl&TXFSt*Vb8cKnZ)&JK03Ixg zJelTsdMqL>C ze}O9fdf404@FqesT3#&_G;zEL?U5AXB$%~Q(%ASr9$k6*^ta#elbLACaI4rx_~+f2)b0c#k%_30*WZRJy8{_f|WuW#q!nb*JmwGaQ9 z@G`=#ky88t=y=_=1-+G!ugX~;sWaq-NYb&w)VOiaX`<>_#WkJana6)uQVh#kVQh_IsCP?lcUoG8w z8C<9`&5}%`Hjs|lOGR|9!3WjE2IZPB;)ihMH60<4Zi;J8=aZ=w=F_=kYQlW_RAB$; z*n}axXQVhBZR5$2fuXMYH|f3F1ukjaU8>YNd;8-9Q*ai-n1?0#ZGJ29BFF$nGC=qW z&vGlGf1ItD$xE9MyNa-n*4iUsp9g>&by}hYaY`s-KTWg{f|!L~C`AaHGEl_XDccMh zk!U$f8Zb2h=tKl^?s`lOy5c?ZeGP%odK(hJN*B9BOdz8h_!KF<)ZbQUO|}M+(Gio& z7%MZ#SV+s5C=zm78q-06hONAh!ua-oq3&EL1_;KB9#_iWm;cm1CCZ#Z~x z!_UzrbclP|oKvOPu^#U0wQ&R|nlG2vxeBl!?iA)j&1q+*mM545L1%0!aD5Y~Y zUzQ5m0o6d3=2P};0^CfqF9`JC5$_DOdB^DT=I5dLQAOK3mMzJaYSi%gXV1e9RS=Q933P|RQ6(q93 zrIKjm0muOYv|3Itzq(T0J)THS92i-4JhjSwMPb<*$-cVOvwaLEDMFJDN37`c6=M!Z zypxZYw=YZPH=bIx`=R~if!>YD>@~aN*?4WsCmo3{AFj6BC;}n@0eJ%T-(-;7&+*4ewMovkyxNMOvM5Rh~;jPL=Ze3z; zwM*|UMM6n=TBK3=g}eUO7fCWEuCah3_>!H)BpCQi`XFLRK6EkNQA_&${*WJznx-eI zrQvI{DKDce?n1j6Jxg2N!+O0jYNFa#>9CB3XLzmIlOV+r+G8%Dn zIqwPDJH^fE;4RkI>w>jY)cp2KtzV9qUk(s+FkEh5uS}LVp%EG1bV*p6 zQSr+Grx6z)ZRo_**K1v~bHmboy>g;$19d83Stv%Ql z?iIzpAGsuWjkxz^KqvM}@e`a2^z>pYxuzDa)e3peYAb6iSBzJB@*{TAa45Des*TnM+ zX47b(U7(UxIAr8%1v!x|(Sa|}*0?aZZ!(ja+&4IWC^r3?fxRoy%+u z6z?>8oTgh{;gGIAOnjKLFz@CL>4%uNO5W28=ZC<8(q276A94poRZ+6))upq z;}duM>uQzL=Qo-oe(PF($LiHwr9p?0wHD~0^}nLI6{wy2lj0G~9b>)lC7h@Q<8c@; zy>U3d(15#;P9+ogE*6cTFNBf$sIBP-N(M3#>HM~5e)z(Wob5@mCZHVj}@2sTp^Fg0F?kb{00Im~iVx9H9-9BrtIEjbo~r4W90 zX{s&I8FS?0&TJ~vZz*a*`GMH<8c!l`EhfKn{@zy5*Ub9lGeaFQv(D=D*}Z{?WkBzC zm{yEL3PGE?J?C0|0gCD$YVqMKSr)ju4Y(pdcNiMV&9$frok&b!6kH-d3*Ctj#Gdch zrzq~a7}x3JHc6|4?-tq#lOiyvRgolD2BDQ`kuGh9Cl+jd14m8oc|F^Tj?64Nu3Gidi>t5tn>SY%kj6Z?CDf{J;P*>k zgO9Jw{?=dM$W2skgE;KyAj<;@@P~N3rJ||2IHgI zphO2wO$|wi!;;gQY!Yw=Bm5b#>xkq3#ba1$jM}ormau5A6!b@-l~8VF%Stec90Zx` z@42v3ifEKV2H?UzDNlHF5vw!Z8|jKAl7Vs{xP0yEO zSkO_;n@1N?TO?t(4|QHKb;!>*!IzM;g(EA?Mx!aER-=3a-D;s%#;^~MU>|JIiPum! zF3Ot#?&V&)vM)tc5aC*aW|q|&(N)cKvol_L9U%^L6*a{go> zNqG*i{57+l{URD)s#q4~`%0zC1A>st>;XlJSgZrB&*r-B!s*kr{>uyQYn12D-3J^{ zKfl?&m~stRAKk|1rW3bu4!d`@a~`DAg}2In0OU$ED{NsYG}~z=sh_3@AK;TSWp`1F z3X^msl_6CZQz)rOQ(ZSNzS3F$rt~k{J9=`Hdn^6>rn1Mqc_b_LXWdkvaB~3-%@r&* zb57a^8`^?wj367U*(txq<8GGT!-+3)rIRj{y@%m$Q%HRbu^&8ZhFmOgH{$FOV@9xA zex@QlZ4F^`te*Y@$EYA@0OdtI0Z(G=>}j4_alCZAys;WShPar!GQ>Tl694L{SMNK& znuqH@4>`0 zy`h8cxs-prcXzlq4i2P}R53IYss77Pef(PBWVrGxsfbt;xG}yiTfoL`F_2%ck4rX)W%WS=KRzKiR zx-*qQ;BU5~eTc!f+++Ue+Crb;}p&=aeUk zp)vLz)N?7=!si@{ZIewngt|oK0xZ=2>!=V6iU#`(zfsb|FWMt?W5gyJNfQm-+y^zB z)N#0h<$NttlwiA|ibeFyLmoj4x)Mc(_>Bio9y)ZAzxl}Z*W-U&FQEp-&)+H)ur4!f zZ9EALdh5I=FX0;uPyN?Ak$i_bv}RcZ)x9-p3P?tg#|rDE>MuGqjcyw7f7@DCFvxfF z6DLocIO#ufgum(V?YHB9+=g`o;2YlseiZ=3@2R;%$c#jf^#b~fs)0vr#QYs3dc zIzlvpoCY6A%T9IAWF1f%K+lq?4d7l%r3LimlQR*Py8mK11kEvo$8b(G$Y}&kr?{L! z(2K$=7^#iIE2(?qP!whLg+U=ICIo%hyQiu9nwJ)A^ghXC$89C-ucQu)<6n32d zywk#uD-@;lcT1(?#pEqiiaS?!1)RZB;a@>7Aj+bjsM*sWl}S+AVFlN-dh48cdk|Nw+;6aU41N?_H|{I#)R7cZ8h=vn$Y64HY96XK}h5 z?n;NvMyD_4`S&wt07G;p$G^n?EMPdb1Prnlp8%mS92o~7Nkk0LC%LhBXf6a5Owp!% z$}GGZFybx>J5mwM+_iF7UAP>G+sdhg%|{@KqEaBEf)m6KUk2FRG9PZg=>oW;UK#Fw z$;T)EPoDqUe>{I&@_iEj#Q8zJDBmyYMO~;xH6fR;ogSV>b)ytphj_!OtdQ|Vj2Hns z96C?|Q3c)?){dfa*wBJ9(vL4JC%w9*u9PFL@&8A?s)S65-|{;|Y}SQ1Jm9if2`)0S zMb3boo`xk81z-bc6gY-WBA6fPW&{Va;i%VlLUXgviMf+hgG+N#4XzVe{FoB6$rFN@E}U<6lDVvSF8Kw@i(!1)RnJr@}mF+p{0@O-R1b{2)Eogro%|z=ZkPXTIxjydsip_VMVr8V3Bp%FWTJkBh1Ab7#}yVjlA-`BVQ%(`{=QPuQ)>(E1}yKD2S zR;)O&sfb=eSAL1aO+J3`@RhZzKkW%dUE41xlPGPq4+w>7d++ES}UU`JqQsni|Kp%$8EX zyaax+JK#@bX_51g;7wKVa6yyDY-&@>-2i7w|&QG(C_!P8@*_1Um*GhYUD>qXXKlv=69LU+X9x73wGkxTF9(6CO*k@b z00NF3wFZtW>@wV?5-+uAxquE=2rp%W7Ok>^n`qk2LMcZMf}D7lBHNnUt2DJ+xwwSd z&kE?(39>k3WnT7-^RKqs@?)!`>G4X&xH&i!v4lNlv&(PVci5yd`62^Xz@s;&Otp6zXmlBlTgfwp^59>&=5ePO~T1J z;e*^e87gQ_%ws6n_^jltzx@&Zjhpaf zEn0sE?4Al}fnxNl7LU=F@O(Nv&_^M8(2|J=n;ts`BBydLOeAYpq*f7)W6*|wzqOKY zw&j6ZJS#RREqs!ZR9P}QU*0j6te;;Ho&U|{2j``k-+?)vgKcbvw|#TX-QM1AZAU+Y z*$1wY>z|R<-)jM+oTOc&0svY5Oszz67l3Wzl%BH&&lNV1`lcfxO(di@AJK&O9)y>< zMZrJF|0F+*3Ei!uFT4UzHp9aS>A6d%o_dOB5W1-YVcj$T#a{&eD_mc5R(iWS^Vvi! z8m8Dco)QQyFFdUj*cvrraX5ogIh_hp@dbSI$_P#xo-hTkJ1wzgKj3~RXPE5!L7d8o z$6>xuQPw8p}H)48E*6DvHc5{XVj zyG{4WCsQ4cge5T=wZ@zg_i(^f=;(BNmxqIg_w!qmS7Z~TMSow{`dF?LPL5c@exPGr zQG;wO?LJex&Y&~uuikcu_?mO(f5SHYIC|FKSZjBoQA_g?xs7L=h^#*kvd?iX90B0| z^79FxIDzjs%q(!n<^l25a;;ZOiVCrXrLHDfo`B*-t^iTfCX(innnZZuH~QA({9Os> z`1t9gM}rPW+UPU7O{nSMg@f;V-@zH?cbQO4Ec|3cI0w|T?arDh9`$)Fh+$AZ8aS0q z9Nld&Favl%IQcPzav{jQ!O$VfX1%6O2N_Jv;)0uSI5_q0Ac|aYyKJ)v-9&U`l6$o^ zvWw*UUbUuaoJd32l~?z6^cn8Gx2>-{aP?UHj3wL|$n;w6p_C03n>Hlo?O)Xqwft7` zmgjAW?sfaSs7YIA>U~O-ynbM+zF*;_N@br0{`OzqjPXx^& zu{jDOwg5f;NX+3#;UP@~!)zoDLlGAc>{YNj+Uz*RGG`@RGY3g%Cvsl-T%b!PJAZB1y`uAqov;0+vRTbI#8gf#>JQ>!jv@i2Zg|GOFtWvzlPtlU zFFUk$x!YZxYIg_C>58@F+Fpu}6ujMquD($B7~Jv6K{cLA>+uGBlWxD!Vo>{>wLlP0 zo$Ca(QSf*suPpIS(D32{;B& zr?njK{UQ$-{gl(fk0P?|ajs^cN{b5xUT~J-P!Q>ajfPI8mRPRvySDmIG!aL}6t8xs zM{>?$!JUo;jGNnvqiYJKwUvN3-RZPu((spt3X{XVUMHRtU<>BjoIdkjQzT&X6h;!U z-fYN-r`twtr?B1-@8Y+E4x;iCA@ClJgq`*_1FbiT=Cj;P<~?LL@*QcRa1ha9CG7;g zXoZ&5T&|E93nI@U6LKcpoeB4*{IIoK6Yd;JuG`>Eci6i#-{D;%maMlreD+G%(%%dv zhiqyyLdk;1RG>$#K)$Pw9iubow3AOlhbO=?ANPsa7iGMnrLV+2ZY$_c&h@3Ve=>%o z6pSaKIw93JYd~>B^D2bak&`V!e2Spe{ELM{2N~hwp*tiC7UZk)AFbPXdP};Qsv1WF zr1-V^LkIZE`8leJNFdkSOZuP;2j$I&*y);GrKGH7z=EfTC_}1{cs9M21VUpvuia0pW9`(wWAzK6V*mVwY&^(vDt>j3XsDg&t-sI znY%?bcgy8LJ)4`hG~jQP>n&7^f!<6-TN-*rW3T1DEHU&~kIFq+g2-N_=cBe6wJ}|+ zwQ@z|Xb~NkY>1>s!d`URks=ElvXEL#)fyD&kW$n_pCTQIqYcgt&}) z?l6P)sY#1`MrTiSqw5*be&hP)vBvd{W8HEe9VcQ0&1Pvt`xiUg)QNww^L?CBqLu3kYm|&6z{B_>5nZOvq{p~QY8IO>CX2uqXq9+Oml@#=7X~o}v z;moT~-}VKhLS=_xzJj zKL0+<3Fa=DFsHfkJSIHV59bT=f#jFlq(_nr%_ypE=1ph|@ex2_i*-W6;h{`#IHuDb zJM*c}o_VEC_sTP$`?O?ym(}{N`k(4AzSClPCyGZj0$*&#hh%*t{A-(QdMjiRJ#l{4 z&loabL1fcIViIr-2O_K!g#wkZkU{>ID=;A38Sw0gOMwSLnQ$~y;+u?QvQ1LUtU*JY z-DWfV)0sEicH55~R}RJE2UJR(I~M~k4)I6N-(MXy(0&3NVttfL=we4|Mi-ubB(D+p zkbR*UhaLMny9_!q$SGW8wd4}L;M(Sr=Wc?lWr=muV|^A|`=20JE?mDN)_g{f48wN> z3_frSuiI_6yM1mL?{=5ng?63|n1l^4x&X|AgIKXft588dkV8_7LI$3hZ@FW39~Ql} z@z6xqh5OQEoQuIY0*1K=jJ-GFADufG7}EP-GrHN@n%nIXjbz&ATqksDsB>n~iQ{KR zxe}+=Rp{1AM-tg>a+?D@SsU&NJ=f`kHHh$=NXMsSdFzxA#6 zzU3{^lT+s&I``DW{7qYy1-ION_m=SJ7G9?3h0)qP_<_o#%Y0@RXk6A{LE{%Zv&+L{ z^eK7_l{?qh-?fwIv`L}7_GM`G z1N;{LF#o9JmNrXIE7}#u6kk?8t_rL6s2)@OOr2NXrv9?Vt$9@QRqYDxN$pwf*R}tn zi|e-Q?$Lc*_nht}eYgHf{R8?x7^V!rG)@^m+!k)T%Vafmo4$xp`n%1)Yd_xpX!|cL zamz8w7p-3F0qg6n&sgiWtZkp|VY}DJZ6nO5NGjw;_r@s zHU8(sb&1ClUr(Bn_os|$DZM(Q%^c61$^0=}%z1N9ATv9IIx9WQknJ0I)(WYJW-rz_fZN7u96z1?ps8B2dCZ!JGs{$9_K zo?rI9zoM*sxNofQ%l+>D;r@LC`hn!Y=7Gls%YzSBt;m|bsrv5f3qz)%)k8N8Jv#J@ z;a3emH*&|wCr5r(TVH!(^oG&zjjbR1;=o9zL?>B4F znZl=hrQ$8PR!2Pbf`9*szs#^s>75{by!iDjDBi!uR?$0s$KT1S;&0G^#rwxtNO~`u zlHSI`(%V^tuV4Ef*`cGyM@4=b>;X!!Lg3K(v z1=p-%Q|xD~U$GmXU&M>nMei@Lh;j_~<9*)i7x?{C%rE|SEv}>A-+}jo%q1N`$ZjV- z|C)_l@Ol!igTTy;bkEF7v#+BVXN-ATUyAoJulW5L^mV20rde9*X1#nHD=EfVPWfWH(SPj&BBUlmY42j0Ukmx ztMjZ!x(OD>d5pCc*Dicr#qx@`vwmqi>*pV1!_t1(yAigUNAbE9YkVE^Dr$H=hR^+Y zJ&0EheR{t-Q$b+C!5_mOoxGLzMK~7AS53xbq8wPGi6i;HE?O4aHYz6-b){gtJcVY4VEK5pP0fv^B;(z4d`L9vQ zkp=9ZV>!h;fuGMHpZL=(Hhb+!jB`J7TgxnpmrLP+GY#~>-wRLG57?k|68QQL7U$37 z`@8V>cd#(wl7AF2xBo_@?c*%Z{s*t0V2|!*Rl+fUiCK_KlVg9zx`qMw)vQDD-I?D> zG1kp*V@}|@Ds^JqM_EAe6!y0t`|%`b{5s%i!3)=G8O{vtgLG)-w^Tc z^wYZ?KWTnDR^5m9B)(TdYrc)Wlg+?~vO#)UdQSRL*dF$VgJC?`J3Jn~A^iTRHR=#G z^I`S``zu_xzHyx`><;^JUH^jXF!T%@2Ioi5m(Q2+3;z9V;Ac}mtNcv&(_=rm<0qfR zDw6Ey3_J_eDgHs~Jjx%JKezl;u;c8*>```r{SC72{+9hUdmmfJKEQUf)9n3-O8t<% zoqd&kh26q#VxMP!$F5}$vt8_S><#P~yMvuW3^NB!-in%hCksGd2?62==1$=(X7M!g zUUVt!1MLrh_D9(mPUkpV!M3qYY&)KN^-W}(O|XsZDz=v$VmAO!uV$}d_p{fr*RwaW zhuE8u$@U@kDfSumCH8gp9ri5yF8dyP4$mLj%(k+%?4Q^x+12ce?4Pk`p9L4*13ce} z+>~#zPvap+``8EB*Vxn8fd|=p;gYfgyYFImv3Ia1+26CLP+dTMkIbODHueSR7+z?@ zZs;`$@QN6uxev774Vhj<22d9}i#~caHpGSzxm}KIw%geiY$cmy8^Bdpqr>@5c7(lx zUBeEu``ByQz3dFTo;||e#vWsDVee*-v;FL^*gvv=V9&5`u!=SKbyT;Br z_xo|3B9HIFnDYOt>|DUJEYCdug%D02I3_3un=}<|zl5rqF z#w{3Iai@;PMyJEFGCKlFTDW%I3%8l+4l}E57Z%GGb!os%F{XIH=`kT{@K6*`0Xd&f z-~N90n@H=-bg#ALpEvLKyw7vr_jBL(bNatu2Hn({E4b;y9#WAjSWsG;8(#MXZNf!) zW`1sjzs=>h5&Tw}8){>@LDy#bD2~jqCA@`sLQ4P;3<}Fn4mH@tfDPdbkn?BQl$&1 z@oD~0RVvf6pl#@&^u$jh+wh89QTlh57*WBKmn|r*L!t$W!T;ynQeIlaujRQhU*)gH zl~K`U6}b`V+=$Oq<}R-&EuDo;2FzW)aC&)ZOT#T6zd6yzt{4yxQ{*oHOs=5#hLG#Z z-;nELAC0Ui{e9Z5%#Er@_7 zn}4ZBx^2Abl+s4glzw%}YtZtlxSbnTp5e3latxNH_bYQ(hxSM|sNXiJdACe0tsz+? z{xo2aOU4^=EyDZ}pDxT5+|*cpdlI?j{q{th%G`wh#_9$Py1?9o0s}UmSW#X&Rn6;( z#hUq3+b$~@m#)lB`sg-xzjS-@N4KN&z@xua<{FwTPW*sarr*a-&5fq-Kk;weFU7kH z#*NL5p-fptPB)oSktk(J@vH#^W#W_ zWa(7=J<;-06>Y;vC?EOcfRX;6UN`Ii&(Som0bWx+ePY>fbb8tRenHAB^oQIh5&K$o zALxebRkzH(Qlx&lKhp4%YIqYiD6J8MA53avgq%}l|`pjXO!vA@8!BDp6$)=VMbP# zKLe&IKbkuCgSGhsU?#5X;(nHPNAq1V7s1B-1+a;>MyHzd$HA4%k4B@7JGE=#)7HR_ zsCg^jpgfw^Pk>#4+v3yhf!+C2-0z9|JMzc4?#-VB`*>;$Qk?`V^QXZXv_1w2&x5s; zAA^KqUH&YX%^w2i@Z=aI^x3As=6H4`zmGw}Pk>4|Ce<3BcEq!tQKl>IDAgF`5qqPp zKCn17k&^s%DeS-+h80Mv@_~d&f<`>IJE;S6(g;6YPS+B zb{w36ZA)nP0@z4Dme8))9QY6#m84eCMZT})=KeFeBC>Tiv<)<(PQne|V`+Dh1we;eEywRPqn=ei5aPewcIe+hq^j0FyY zT3~Yc?PTn)oW1dBAN5~@KO6*Wu?FvW;T6~53BLv#km?$=y8t%R`ZdJnd9Vu$UqhY8 zL9KcXwH;@DG>iMCSmrd?ME#{a<+ZU^N*|p9_2E)#@P02fm*NBGQ)TqR5ipI-%dr1R za8_U=PnA*Iaj=>C%fbW8QhHz+o-iD2A&$yYtK*J7Sr%=TVI^zsh-W*|tBiKfg4?6a zj`*~XJD+0J<=>Df#4=O(d@xu^pH4~Lh;~z0EtY^YkY@@~odb>BDXjHIfVZIC6jps# zfC~d}N0%wsVHem$WKBWx55Xm@!=}*t$H8UM$_i{gB{I?!w3x>Aw}^@<$p35bdr{B& zc`I*3H;P(7sush!e_TaZuu&`R}#4?=0;6>NLeEA!&5~;33 zql;j5{<~lex#Bu};QL@E|Bqlc{~d5n{_nts{6_G0EN~rqodBEY!RyfL5cm*YbRC}j z4%ixH9?$lH}yvTJ={#md$ z-^D6-37&90z5FJ)HmJ8p$A)~vEJL@PD)l{nKPi{LM5@b7j#^x#4_i>YGR}k zo4f~RsIxN0g-R^*8rStvgZ8P!G8e!Gbg9G>&Vfs!21kcVV$(ZDVr6PQ5mZSeo&p^m zD$z*XOx#rxo0jRs8kI=yeaEs&a@29Kmwv2_G2%v~I>kOk2A{bRsg8qLy#2<=%r_E= zL%Cj$7geF%CNPc9RN({r!K#a=LC2S>R4vx7V!vi2SeF_FW{Kr0`u!cSk=UuCH!a_k ze*<*RP?cI7*GuxxaNR;gRS~B};2Pq$D)kuFuEO(ub}c?!gcB3O%T)3AwHM-)s8 zn@ppp&Twu1oQ6hz+Cmty^E7s=hJ!n>z%+KPE@vmKjJ7_HglE7iZ2NiSIRV~+Pkx@L844~8T!OVfPfv+Y z$DL;aJ8Adx`0#MhxxsXNRZQbo)9J_4U=_7ZNB2Wu4Q)-w0(-y=u{<5!-vno&?{qx# zDA-8vPe*slG^53IqH-u`R8D6cvHlhK+jKnE+Ez!IHF4caA5BM2%eO~KXBX4SQ71v8 zY&tngse0m0FVD_E+N16XBJ&JnI|60`>*CWa@ylDlv^WE)MCS}MVnmw}Biao5Vib2; z$oVs3M4J(DG$ZwR)ae{`2C;AbopIe2EjpsjK%N6&50cLyf=+YzL)E7V)N>VqiQ^G8`n#*Ni}`(&)_orvzor>0w2L9)!5-$ zu!X(E>X-{vV+Y%Mj3}$dOMd{ajkcT-RpYBl_-x45k^kRZZ;jTU3%xqyju6xPM)kNY?z@7NjOuX?tSjMQ?+`X87Su;_d*~8<1@#BZB2O zkvC?>%4jAz^Bt}`^S=Ol@Wz?+@@cS_{;ff_-Jr77L{_h%#baDMUf0k&M?q&$HIb`p z@H(G*IM57GgSE$jtK-fZWUIl>KD!~F?Fj6|J~c$aIdD6z*C4}ru#fV!_}H7E<8LkU z{18kt!q&!ET#Hmc;d%y9P>XD@fU}9^T0HG4aBe*Nr&zC+e0~M!Xj_ZdS;o<}7F}Kd z?_|8F#p{lMP2{Lr^x6Y1j%SxJn%Cl8`@o0DqP2LJ*DII{)#6>&vywS$E&39rc-Ph7 znyB+J#>85*R?fBbS}hr1B&c`QvY$N|Y$xy4;%U~?f%n#u=ao<&tHmnz*DTo=lJ8_h&V=w1D6py87%oas3kLD$qbgP;rd&w$TC>cIv>LuGgwlY*G5Tmeg;ea7~DiA z&tOSWOJ=a-%b=FbV99l$mdu1DGeoPBZx0!?WClwf138fcwPXfM+M<@M!;g^?y{*rCqriOmi=H8{+Y!lwz!yn z$>J^l1TG~9X0eRrmtn&!_VM}=GJFe;Blxq5wgay@-|oa^rR)KzmmGKj9uX3?8sX<#KjGm9R)2v+CUgEc%gi}B@UFhf+% zVr1C}y2mw(F=aQ{fZb*xq4hi-H9Qed<&b0+5>=&qm~IP696j+sWjdxzhWy zIpOqvCufbb(fu&kLm$m%_BaXbCEjOq?l~O4EJLF?c=C&2C0fj3>>Uf%lELN>*(G2d zF*}DI6Wwi?Lm#~bHX-4h(0vX)@@cMHIN6+ok6i}3e=>&*a}ew#UgmJ(dIi`+?9V}x z(Vq4)(#;J`=c40VT)Rs-7wvulYPY#)w3jno=cV)Lsnejl7V~)aFzEikJZe}6)==9# z>e&Wn$h7mA59|c9`KLhV1M}#$x4;Hsc^;DI!N<{h9;?FR;Cd`G56|~b4o&CLgWX^| zkuncSehKPb^U!EN=$_2Hu<*RF@I3tdL+v(i^lTBBCWAF#;e+6fM12D?zXH}! zz5$tE05iO2AI~Yd(?}g8IXJ zo+<+CC_g`*njcTikEiDI)CBH#(#mZSS+~(gXSuGV?{1@~PJ`9Vb#Fs!uWPZuZD=hz zSHBIdp9Sl&@NM+eQLurG!Fhhv(}YI1kq4}8Mbyw5_j6HxQ5W!j2yTKOCAMXO)o-*CqQku2pL`iGx*OUY`6!^vM0F+8y*7Zkfj%4!=2z0 z*kMuZ3@pO8&vLyfK5a+$MOf@Zu#;T02){Z9I^r)vi-X{fxUW|)B72{Kw~VJ=Gb6^v#>;>H+X+qO?!7SrT6Pg|X=TLtWnqC0cN6nkiqKU{AHwSh`4P8Wi6WS?* z^O+{JI|4eNX+pcRus~YKpUsT;hrlxOe>1Y}1gn^dH6z;vu$nyFOk7le%of2qvR^ZC zaRXRSyfl+7PlI!aqh=zKU3Er$Yrd5@ZN{su$2CGTUVQ>wfjrH`)b(Hsbu^Pp+0P}H zT5>%*$jxM@cR^<|%`uZ{#?HUux{p!mex52!Jpc|#eG?oC&*pk`UrZE_0IRXp;^?o% z(O-+P;XdxTa$ijAmV6ZJEv5&LgPq9vAL+r}%)qWkwk6av46G*GETNuVV21I1No0~G z)b={p4RObvhb5^ysCfxBp9deM&Lz}*1l)|iOYnztplq23BTGCOwtbNLU*?Ye{vfTq z3T9XVJs4TyL0Wl%Yxi3oBtpyJ&KRLf@ugE>8Eq}4zm9{I^yX6PJOftaIZLVY80d-E zQtA}z@Uf-T*#p+&6-)6Y>uHD@+<{*jW5iP8#ry41W^L1X!0v_1>g2d-qKewf%92k&YQ zar6k0E4q?;gt#jLU5&2f(@%q6itAe_zmm8Xm&Tpt)U%SB#MNYgm9WW%fKO1*N@^Pp z=Hhx2rw=QsQ`}6PwovnD!3K8WTd4m^5SA%;Yv6svU<<8W0WPP-7FrQklVMtDMSOyJ zehaOn!5o>Y1ymS>(jRf6?Tm@52 zG*_>}bIyZ~M5|)#UQGsmAFWFHbT#>>19WeBHPRM=?*FVt+P$DzVl~qCf?4KltMSqg zKzGYmv$D7VHd6m;B=ou&T~;IE8PGMwY9#d2$D{ry0@q{b)yTFFG|E;ZoA_+h(1`_B z<8{ZtZnRsCr|klJk>^o-^&sep$)kAbac~=UUK0_wCL(T4MBJK)xHS=RYa-&-M8vH@ ziw?>gacj`UXN|Zuu|u^6sl3yUC$B-Olc2G-CSq+(#M+vOwZ~}XHCUGB>c^;GG}k>w zZEu2iAnjve^T&|$EZj}U>(%X$VtGGkUTr0oPr@m^9y_eX*DnKIH?2js^I$FQu0^)j!8&?#EwcRzY``XK(S09y zZ!RT>zEac1wFS~7bE^UtZ{~G&r;VBmuc`@QU2S+@;bcnFz9T59qnEXZbyc7 z*x?xHN_HKy{Sl!1_Uo8K9)V%&9CZU0=mcvhvjGb{2WHs+*?{itptFt*w0;iUl>ck6 zJ--~>oL>oU#gjMCVj<}2W&;BBu||Jx6xBil6%j? zvUSeCF|sTB(~RaDk>?a>oNh#(9?&^Idk>7}8zaweB$JHb`rFK1Hj*E_ekSn8#Csb) zc?vAWOWW|t{a`xosC64{iPhBK7Hzdf@3+xbA9w1IjXf3Cm2I?T$ys=B8`d}pdT!o^ zO}xK6N#w)*@RSYfifI6A(i*#&uqd^t^)OqP0Rzo1v=ty zB2w0q*$c5rd(_!ZoiB53o$bt8{nVP<*@M~#HWK^o)ZYhMe><7*2Dpn<%Y2`dPm#E)NE58Jr*tOUkt!!o;beQWU z?2m1x#bcm)ZKlPs;A3&eGoa11>sY9rH`DI-!EI6VPPEv93_&InzGH*qa zH^3@d+)7?50-ZN*O?`!4*vh)I5WF|;ET;Fj(l6cM3gUVznb12Mh|R5JLZ8~oNWB$( ze+F~k)#!6*cOI;b>r9|$ZO>8W5NI~&!X_6$Ba~An{J9Hj90%R)>B1UsfLZ*Xoe%PD z7ro$9O;KLY?4mDx*8I#k6Q636uCPfLS2UmXz?BJ4m8D!(Q#Yk`E6vsaqI|J^C@Q<_yeZ_)WD7=QS%Z{?EyQfXM2p2+e14} z^OzxTkG|f{Q#-iMV9)J5)dAYe+v(*qpyyEA=~=Ja(P%sJp9kGH*pB?(ci(`w`SFMD z@UCup_Ia-5^>x#y?|{{0vu@ft25SFq{L1^z*1Bo&FzCr_cg)$k@$(B@H{gxk*!c+9 zgiX4!@Q2`vxMObVX7)H3Tpu-WppUxoc3bIW*Rcnwc7ytS4^sUIOk~H}z274j~ zIn%@Edyw!rXbkos;jclNPCX%E4-y{bdJemSJt1Ka5?a0ysd|v`9nhI%4-$H(mB{Tu z!Xi+fLl0is3w9uR4-#%?T$J0kgIVHmu$r-E2mNv$)K)vfRy&Yk7uU1!t{t>K8nne7 zw73`4_jW|PJ0c=>(C&Wj$adI4Tjw}~_b*}gh8=qG^NU=Uafa0!ebkE`_Hga`f|FS6 z)=TS$K=+q=vBTS-t3P(Z9ZrF@m=xo1amj; z??k(kU>ZN!iFT(!XW*RgQQJ;x+XdE9p7RHKWG8x^0~_$hov{zF6KQ?cSldagodMl( z^1q?1C3xFu@NgKdd|6Qc^&sYKSN2~QvUV-$zaGpu__zJnMZ68m*c#6cNnKSiP#(rf z!4$^tg}h1g)zn||^RJkZ-NSEpu=~A`9g}8$HuBERU-0>Tfq%tr&Y$qv?UcHQPwr;7 z%ICih-pBhm71VbR&wG6*SM}_;e3d5`N2$B`WFeWh^kc1-e$=j?eUAO1&w{@#*`+dH z3TeJU3%<=``KdhNGye5GrT!YN+|SQ@*p0i3GR@q-o?V|CC^?-qX(_u=oN7c%H^guE zfxpk^zuji#M{@bLR5Q9(^M2CrvH#T=8s5vjZ&0VQe4U^7aQ99=|99wpbG)TSN9F$y z?fh&1y#YCyZ}FjLR`K4{i@c$9JFBB7$-wwo>P_CJdL6dG6m0eu>)h+n`X%z-E2$3( z3gd0BG}f++_nUskn_W|Bw=1mhDfIswYuaD%Ue=xDr2oqNdLy&%Dm3){un%R25TlET z1>Y2#$tmf6-n7c1#h;_cKk!!7aI98~75Vc&^zlu+gY^~mf){W?_J_RX#!djbE@QWC zBy;jv?9zB*_$u#b-HQdj!7kxM=5bG9(|zR0$5VgASNs(5b#X%rhT)eTsqqEFd5dc$ zYXska`!S>DACui~#+nb{hxg-kU&Mx=Acy@4Zz%rv)M4_^B<8$B=%2rGzl|B=V#c5& zydQajx4QnGH_ZMMZ-za>m~%N1F`Ah8Z=5oGl6TLF7`1-Fd~#E~@#V>ZI|eIQ>?mx48kSQ2Za9P3S?AYJR`)+^6yO~>93Eq|(JNSzY zH{U$?ru*-^r|@fE`C1YGzH(RK*ZKV}{(b%OuibP1ec!nM-ml(w*FEmCYB4>Z5=5~oxFJsJzDVfh0T9~4t!SvzLSqn3jX}7_jxba?A+l` z4#o8_uKS|oBEEp}{XugFrIH~fHTj-kzcf4d&o4oMqA9U#1st3lCmMY~4YGEQ;LKgts>1aSz~K zi^H=Xq~{;Px0mB1593k3VUWBb`6#;wkFoY`Wu^N)Ja+@Jx)D!&3SZa1+L?p3H_Os@XIy@kJITI3(8WJ_=JFbSZ@{+(WPW(s zBk!HRn8=mPHcxt;!TO$nZwdI0fNuym7igrU3`?2R^4@(bAZd+RJ>^{ac}ij{&NrQ{ z_3>{q<1Sq1uma3ObZ{*q^WQnBtbaNG?vl&*cl9CH-YB zK`vxL*sp@w%?D`m57_HP>OYD$ub|B#+ISTkjf}aPtb957GV)!m%B+)%FB4xLzASv1 zk23I`$IHH#doS}|u9>WRIrlQ|Jumi@NM@N#dwKTmE6A~Tek{LUcD>yCMBag(J%JVW z;}0_Gov%AvcZMmG-rYX;@U@})8S>{7O^@S6o@Tq^aQ$yz>s8Km>|^(xTt(QgzSRNC z80}@ryASG2Nq)S$I0OCWUXHAIIq~+PHOYpT3ojF19=x1E&mTQ!Dj;%)VueDiREE~F z-{ro`eD_@26}#Rj<6XYHY0FU9}E8@7XA+FnZLuz z8<9whoIoPZyReenbeZYymdHw%lP)7&KDumlx#%*{-B*)^E(cx9$Um2TF86#0o^uLY zz8Slyvd-n4%Q(LQ*>(|W@RW%tx#sR(d%i5oT#mV%4f*AsCmUrl%jK0jua;BpTyr7T zl9lD2oJ?|gA2_*mSP(QQ1-=5}@SN#t@*%2hi& z?u%whS%z0KTO7&kZ4@)9(a7`;mg~cEM$a2qj`Ko(%GQ>vEmK>bwk&Nq+A_4|XUoo( zn=Lb2UbdVo_jYAuCpqm1G9JcCuQMmo2jyYQ!j^+A1KZW4>}$E#%3hBplZfQ}mMD{N zZO$3!L-({~S%A0mw&3KGew3FiD>)e_ruL5$KgFY5 zkNyCU+J$W#D>{iicGzHo%070_Tvli@X0UsM95RmO8_PD9Yb?`Pp0O zm5(Z~S5~i_UU{hUd1dp;<(0`Rk5?A29A3}(>>1g+o|Y!r@t^6PL;byToE*UT!#}yY zvQ6C6Oy+9G(P$67^DgT-+0B=+c#T4fBD5Gn|Clv)qQM#Z z#(cY<%yBuApQT?o)yC&!!^+~47o13~*SsDKSoyDVMqJ6td^OHxy(amWJvOW;J5#Rf z45V@gNl*F#p7bmdzTR(h7>n%Q%Waj}nt0RCgVQRbRX(fPQZB1ZR(Y(lSmm(FV3ofr zdsXhL%vE`-vR37+%2<`JDqB^qs!UaRs+PO*GH+VXH~?!t<|HqYNj&YkNEU&& zhfeM^K2BMAqw*-^jLLkJFWSX@xuP;f&BEiDCywN-u#~mo1V)%%YG!OE_T+}vF|Uvp zDl1e@sEkngpt3>bf+pjvdz_P~?GS70;W4w_NFO`L_kEJFjP!EXOQ>x;BmHBF!$CQmJ7gHvtJWN@baxi6J%D|m5Hro!4LUZsR@+2lJa_!EK2uq zlNoLfSx+PDE6Dmv|5*PlR)V{WKg*YtEh$&>A)b*ZDN9n0qzp;cL>Y*3TAa7J+b#333*SxFt&Rgnkj!zw zRiJD`zP}y~N~lxOJ4fgD2_hVlz#7s@S^Sr{t~vi0QZ$<&jlmq_dW5$EPSB|FbEbeVZc ztZnoVgmDW6R?n_M<$xdW@g zB;H{^(4VfpKS4ylkC&b!GUNmJPIM8izCo+J?-paWCxD#J;#02eWvMk{*JRChlGe`9 znybL`cI{J7_Y<>(7UmJI*JWemBy*PyOyBn72Pbs?%s~ydJmLM>6Ys-s$^b!)WPOwD20z?hE#pHkSD%?@QK~oUdeOsst_MdtFV|@jd^M;XN|F zRlH(=AOMaI-Ny*Nu^Kkb9(`4V#_}w`AuzzJrT{5}kaXD|4!{z>gyF#O>-SMRp z+wk5Z>=1cdvbN0aGPdMv$<~sqB~vTud3QBAb7!_CKWj*=v}I?>%}U0z(?s%lVkhx{ z-<@IQV9CIee&r68{2UayQ!5KRkPW zy3--E>S6xLs!Db^oST?=PSBg~sGq_%&UoE>_<$aDHsS8>Y5JiMn;666iBEY`vZkD~ zI)hK4u47QKcjX>+UMv!*C+0k?nM_@Le6KB-9^WSWR!8W zewH5cd-!D^@qI9G3FIEhJd$@L>qr)Wj3fC*vW?^#$uyE@B+E#S(UaVlUnFMq%B78S<8XtI9Qz zkCU*xWdFEtB=bk!&&OxYSK|SDqmShJc#bB|N0yJg6)hpZ$8kz-k9&!ZRkC{I^tghR z&m)^hE{_>U9*+zWIXp6WqxxGr zPHP|1+B>x7i1;C`9iX+Mn3v1Pk&Po4$DHPOd5|#~BWj{o6J6xr$i7L=+pJAr8yI8Z z0>@}Kf||}TYRk1rX5{Wl@Et8-ojoxJkzFIV#_n~ diff --git a/www/bootstrap-3.3.1/css/fonts/SourceSansPro.ttf b/www/bootstrap-3.3.1/css/fonts/SourceSansPro.ttf deleted file mode 100644 index 950ff8bd4b3be8a80468d304851d7ea9e7bc436c..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 35064 zcmd7537lL-wLe~UyJvd#nV#;R-uIc_rnl*3_I=MXS!S}#gb)(QY63(EprC*nwy21R z$P+~bp27n(B0@-9P!UlPd5WSu#5_<$Km?xh1WEVrd+OdhwGvY_j8YV`^#&x5*a~L~oC!m89t5(iD@r~!+i@$GY%)WPGX6^86 zJASdAu`6x3e{|(cDzo9<>rP>8TO5CHKI6|ZY{<%B0oV&MJWID9J8TTu8?0N6@VD!2xanHrrsW0!`wq$z!w2fcibKV4{k z@De_I@${0MzJ2Nbw&9nCGtza(_V6_?6f*p=7Yfhs-?3vqU$W_f3pN2gv<&)6Zs{7} zZ)9s!?CS{Gx)SVb2v9@VE5k7oz^D$VhSiDTRHF>#4zcRg189;^<>4d`2kUq}w+0PC zQ`QvZ@AfwO8uazPM(FfF{*oozef0mrmXPBRLspBXkw987U>?VL)rg9l@ zs}Webk!zB%%=JszOq11+Fy&K#q$3QH#yxrr@ElZ^* ze5vs11O2riNC+;H0sH$_&Qv-I|x&c$b$bj|IbU2)Oc#OQ(dzkmNR zkOg!>zx)~WTg|3U+G{oSS}oIs`qQDm!_0vC)naZ9V74-WO*QUT$k_NTeoNL8#IJt? zzp(JDH{axKh4)FSQ_sfE4=J)6}%zlNXm#g zT5?i4X>)WKM=yt9yASz{2t!3{IKZOxj(Pe8E3AGzt+ zUY;-fNS+^dH~Q6qYKq)h#F09pnT}{C+C*DuMF_pR#hIzK@bE3;ZvGAgZbPVOY2zrqV6lg!J%dR`-QgHvQFPF8AoXVeboFN z`J|^#p+e`S=OS@hK_x0^6o*OLvl`4Y(NWJTkP{=z@~puW)EO)oqK+Fk{rHckKJ;#) z*!_ITTZMP=wU<4v^7Ny?r%W63BAO|TC&nzvT!h)cI+@|#!qp(({j@;jd4E6Jva_>Q z`Ymd!oG>ph8JnE|c4fhkD%4icVN4V>r5Ib?e9nl{JQ6hK+B<>< zT~HSeLNtR{PQN6rPhNcbN`qdXzc_VCPOqz&0u^q){Bph-oU<$buK2ZuJNWu*ktuv? zejEvm!}NFNNSOg`jx?pBuwE&L>miP4W)4G3%KC=p2skG>F^-1qx<5|nb%vGeUYXGA z4J(1?)+;l+b9@Gve)fvYj$Gjm%s0t~ZIBHn7S?31B5E~+6w-@XGmAA<1 zpBIvV)L5Mq&h+E&B-mG06MT99j-}D)(jEQ%JC;SG%Xaj~C$cVAb|S8%HR-uaR<3;i z`ebVT`&X>IWG=lVG;v0M-|3?*Eu*9?CPIpiuz-$r%*swKF|`$S7^{LQ20;xZLA}75 zB)Fo_WUWi;))-XvtZ~B++BXaYgM)MJ=g)j=-OQS`d!%d3iKXqiao+ll%6P0?uj*wVXkNi=|BQX6ExIEZGAEslLDylZ zq#h502!JU|P0`j|7sPT?4I$IrXH88{Po2drH(fCE^ra!cVQ z=^9gfJUg|~Sbz!6Sq!rFPne4=o7WLdMEItXnMe~LO*5hD@M_#o1C2wh38=XRYAqmgw0UOn8x-+s`4ub-}q^jZTxk(PiAV_VF#i;HI9f-Q8Pz`01piX*DwGE%fVW=fCrQ z6&h&NFSVS+{>w^K!b(>$BeUr+mbsZ(Mb3o|RsPqo)pAfc^0o!4$GUE;(p;&pwpE|9 z{FEA7jlQz6YHZb&ThFMhuh3T*E4G}0Vcpoiv%P&+o^LDMn0uF;gN*-hXh{hF3g?OW zuE&617xO*8m*IpbFPUCN%V?xb*A9_ z{ww&{Jsan0t@ZjkOU?S(uYPOe=2~ZizRpo|+AN>peYaa%-R@TF?S*d@zVa1Y*5k?A zzCvulu?uJX*TB18yOQ;({Gph98i_RPiA)h;ZNk#jVHHC3DXXx9`>_l;tega&D?H3^ zDSUySTIkJ4w(+)OFOa<>v2Mt)`}ymztiu{ND&we_H{KRah_)ihz^NA#g6>m?SpB@b zwSe=80*9C#Ft0$%f?Po42-P5RFg{`K2)$iy2=~JdZGy=|yJv{F4s#Rj_VRVQ?vH(@ z(i-x#E^+$1wsL+de|^ME%{eOQ zK=<-kV2Mv>7@qbG*gV-5OP#kZ&@&-D@|{^XEc8=4`%fPYdfn+gE~~R`G7%Y0Ifex< zvn0lS5OchEAFd7ZAML|CPQ2$*_TkCU;M!Dr%pPq@x&56HYg4$>AM9#s@vn}j*YpKn z?>lWc5VYn^HfLrm78`AIy3OtGKw#)J!GkH__bbec84NK$FN(pgVW>!AZK4`!UK&g0 zrBpOm;7*yCmpX{)M!|-Sm;;-b12PI^&qxJwvS)<655%Ozkh0GqjQ!;CoR}1Dh*S`> z5$pHqXGRS=_p;WFXRaL|4D@=uT^@Hf)bx7KX~WGP$IOvqon5Zz{)=W$_Xi3zE%3^L z4{1JrDArsvTdnfpqVblB^BRnSg!my=gC%AKrVU~oD$aldM*O8>PdsJt%l4WwNiDe$ z*~W%sOW%rEa!H#*S2$F*emvOYbo*9h+SU#<^ECrqj#S95f4%p#;h?W~P0rc4a-+rA zZuSI+Hf>q9(h}}!k$K7k88sk10sr5+la4@{AZ^Ap3+)i2$)JrG3NGBCHGs zX&p=m4rJXN-V7LM!F)$P*G_IAo^ZNGckGxR9v)j_jT)uPYBo)c6i(&0_Log9TUSZ` z5gkhuef(w6*9g08j-9FE*FyZ#!ZeN=BfuCd*KD(1+#eHk?uG3xdwW`dP!xzo0f`AT zdjZJ;k_BX`fV5x;)5xXUtR%5$`NEHe1zpDtkZyTwk<>(HEsRU{y3wkyga56mhePlQ z!!9YAj-1 zn=_l%t_=*H(v?`6cmKfB;%?||ZS8Gvw@inVMrX4r;Lw$sVm@!DRbL%;dy}<#^GG~0 zn6Mej28=mxc%ao*SyAmYTRk0pfxe{E7)bLK4W3qKdrwchv(?i;`e_Ta2axCY>N>pR==M=f9$!XvlV6iy0T0{`hbd*Iw#L#PD*?- ziVH@=X3?CyW1kFS5m*%h}g_Y`FTA)zTvc4`<&k{QAXrT}t!; zj}-sRehGZ)7x`o~aiDcC?@MKhG-bQF?B5OLr>E;G^#((AMUycVksdjAow-5k*Xujm zAvns)}va%;W zrtO@(8Io0rDNCCIl3c1~Be)sNtfte@Aiibs&Vl;SRASkZ={PoT)A1C3`19kzR9ifj zRatyl;b!7=B)~;ohZw(^ZF}eA*Vdu3I7)pyG+a4$pe;(;*{O?C8O(x33H*ao+Nu;- zs~C$#i8f`O_bPB*;O|+a^E3mR{AsFkP|ZXVovN*rlseQ6pyKmMw)C$~Bv$vgsOegB zOU~=fwV2gZm?44T)B1W(8zSSQmn;z|3Eu!cxjfoU< zTmvY3V=Q!qs+uc}wuzM@K0`9VBz%GL-d|=LvKD0AOk$~jypSKac1I^Lfq_1|mBCry>`nQY*J&r-mNDTOB+$oIv zSAv&<>=Kom7R`^sE84gflS>=7W|SRR4@uNLCAuqP+OQC`$WubZKyHVdq?b8*t5y@s!6>*(_eT5>(~W*@I%0-P4gpJ$TYE( z*eXc^B+1y-{76Y=5lGOcifq`!;2sN03Q4W`k>-7PrEVmv=0zIwjl|Pwvo~UPizOnQSqa(Qc}* zsA}@31D;&O8ggUFV_Y_jYfL%|D|zgsbS@P~By%W$ia8Nx0XCFK&4AX*qz&e=y{8D5 zQQj9ShHZZH zRAw&H+KZOEHunmfbXVh>9$a%ESWUpCVU3noa* zHn1$aVuC+kcyg>S+=^YgV|gUKS;VP1d6N0}f$L)bl(qnsU6BST-2`d=DLCp&{8Ke+ zH&$D#_0>()8&}`88NI*UJQ)m5Hghw~8_XL7!hPs>v42YIW>LS&L~11#DcaHv4T5^g zae#VgPf|ID$>qp=f_Y1^EyY{&PubQ?R@52v6%CckRxPhI!Y5T%F|p!$< zrBVGpI2;I!1h`$!4F{2P@UkEr{A0nw+k!_C%fR0FdGP4*{wZxFi=^HnlR?v4biM($ zrx*|-7D{ZVBV6L2GFVIeQ+I!2Zm8N;OLNh)?h`l7P1HK-^tHB{;dO-TU{N{r1m79lECXCu$|ZF= zVVbs8m@8xX`s(klJ)_zVo-tRgUv+=2FW%W=bk#ImE|v8pn)&Yw|K*zq_$Ph5_Soyq z{Ru}|*^rE@7xeuY=)2gLrJ?rDd|BjDCSR79v)}UNMaC-%*Tne+Bk{sjWc17DW+b;R zBZUw{Wbj=7Cx`d(1n}oh0{`6tcy_*>-!FhC=HV|cfbX7%zf5rGRGhKVmBEi!2C4i$ zb*7Z{sd@5BWr^_PYUH56XzhGpRL)UwQ4Qme^Fnt1k-#DSa~OgR^9uHZ;6ypua6_o6 zyq=d?{CPN-h=$^n0ROl?-`*$r3Lkmwj9EU*Z!Em{!V6sD%XjZS|H#C*z9pX<0R3{s zRyxOl@zGw%z+T}v@dUUy#~|oUr-_K(Si&cOKX(%N?-sy`u5vpsDsVK)?i1}(ObzYB zBBS&95`Vde z03Nah4x^rj#WCHQRS;($A$@94hjNEl9L!NCn8Tu!CQDQ;=bwi)&*zfLUFBqe@MomR zBSWE8E7x2XhHwY@Hpnu!c32;`4~8hXYHSE(m&Yfwt^j|JH-OMzJKS$ zKyshMO~KamDqp6ZqOF@p`GMARCn*Z+_suk)5^7;jtA?g5jNvml`4xo z;@X~G_JhlwzOu*ZM3hd6$W~!V$gU>x0Lu1v4aKYAT~e0?Qbd;FdG5io36$q<{}=u_ zu`+yxnPulqx30VJf^__o#z+8zcdg3!vgq|^YE7l4n9S{(o5J2)UiP}!ERJ%a*;Z>(bU>X zHV7F4WJv7o^=$s5e7OrIAKbV2UH33l*t~w54SZ3R{1Ncc=zh8 zwKuT2y?wmiy*iT^OWAaV?{Ryi-5cz5dVI?>ebcVYwp9P>t8b`45GXR~ma;va*(HYk zvF32IDetmVgooRjq8;gUhp%^S&ea&|kK3%qF0-ejIgy+ko(~RfUAAgw5~Rl5CyT8V z7r`9(#N7Xp!@Vis@XrgL2nhI54(HDa;Ln}}{@Vp`ntQpOKPYh0LSGl{??A4c9lZz% z@gkBJOW@DS@Zwv5zg+_VtpfiuWPv16`*J&fAUM_r{Il#f*j$UxkZCrTb~aad-QZir zwv?QkzytN+-z8pdMN0>r9}l)|4q3H-MU;MBg{&hrc4G#(lL z2ZCc1$>JaQtNa*bk_lVj`Lh;L;`nIE5^xc~rRqf&iweC+K?ag;QRWgn9t8)>{?`u0 zReu7_7A{e2P0(!jgxkIOu*K$V>GbA9h(k2n-Q;Il+1u9AE@wlN?o9KkVfd4xBdKu2 z*)|p(Npgp8eLK0E+IrnXzP0TX2(#P!XoF1S`m@fDwQgd)@LRuIUF(XauFX{^jjL1M z`^)EdD4;64%^?5Mo$aG0qUyau(&{^Xqm{Q3vw8IDuJ#x-h=7Hz?iN-OrfTa4(^-`h2G+}a)NdN2HRo5hk9K4mE={S^N8ttzb) zD?sxpcMz>QO2nYHSECKOo#_Nq_ykh~mA?qq#leYmZnR*6t=t+UE|r?7l=Wkd7yPp|+_N1xO35N#VB;YcHd$Jy}*A4}VsX zVaLONy8upWOm6273S8_dMf>DiH?U{f>!M#7PUU6z9|#T&oX48~o%9s88=acHktO11 znKm0*RQU+`Ghx~4TMx4|ONdAao$`jLfu>1-doAGNG;uN9X_U4LdqYqd$2rtfeQ*b; zQ8L-=Y_dWFVYLdcC{`-34`c#H&i%syf3Dfo6wd7KUGD8#*%n*T+wALD77vX(>N-Ln zwOx|y4KAU@c-ZLh`zP|PC*_j@nFVMd+v?Mwd z@#V~M=aMMU1`UL-7%>j=6|Yx0a?ws)k+d37lyf8}@|mihVA|Np(OfIszsH{vu;yvM zuC811|4wrs{6zrOn);t-2z9gpEaKJ;+Z9YZ=38z_99()b-M>FTUeI#c z;mK=DV&emdmCt)bN&omjgK3;!tcB&jgndM%Lyo37SF&pe5Fk(@Q%e=?02B^|H3Jxi z>;|m>WB^k3FqV6O<%BY-1{sW4*g2GPVG)C$-6DhDZAO)6zL4~jXGj^r*D1Ald7LGcZLJ~&M!L?KBLPX+nRUv;oL#D zr{3#tX>zx=ANxU7iz^Uyrbi)?ixBjXZ4Xg1B)UK zS@}Kb0EX$-&N?d*hr0QQk+S&_9)9^L81je9r-rR1vFU~9oSWXRSR0N#JSzHx z1<4-*4cyw9HpOYG^{KIyx?ZeU9~28v50#-el@ZjlVmLB^LsUK7;*U)3T^{M}i;TKb zkqrZL+rwk0bvZii4-~exP3}8mCfqTe@TKDU9cvS(Y}wT#>2Uy#GY978o4_l}W>o%H zcFh`ICyKo|MVv)`=u4h0+DX$Hb&A5&DCZLAZ3QWqpFh(fV@?JZJ$t2`=1ofBQTJ3= z_fkuGMOSvLwXr7~8F9y3=DK3zS=V6Boe5d|UCZO4fn2m;wg9qFB4TXK^$&NYrHt-8!XNeZ+0SZMHYuIVg1a&8Ch3`NP$Xg*? zs(~X(VA%vGH2f0lJyNth7+5%@Mo+}*WixjEv=`YkzCg92~C|l zwfTy*;V=#^(5{PrAM;SJo%voQ7c?m)O9Xj8LUJJ6uj`=mrgb_)@GE*->qx5b9e!ii zM9idLyW#pPE*_r9PVT?zUrr^u=~xtWdjxc=heR0DxKeRiXp|cwQVwZ*A2Q;H6mLZ> z=AC$uJQgG;DeeZHDmVf55R#|lc9yNi@((xY%j(xuZV&L*9I=zeaDL$hP#h+U$ve7JD+{tJc?e!x>+5f70Pd4T7H{ zpv!~D^OM5-8dVeqgRVG290ZlB@{=46(D=zDl&EYyH;LyrFl@yiqYa!QJui8|NRxfm zD41#m*eM{hQ)K3JPj)PnTHWI(cFImUczZaxX)_(F7?}K#)#V!6ITea8WG9LMb2fxC zK!?~l(0ev@U6-B!)X@ZqV||c>z+fn7w*`YXdobe;2HnnJklIKU*RhAuhEZ!nIh7!c zu4=Raou8-r+Uc!SEUh!xg3Wec%Xr^~rv4~*yPV!!Vra92_EG{b{vT49U5+kx!2^R7 zaM9NS_!Xe8#MWXQk4iVeyfMO#QzVoY@>8GsHHEV{3WM{0bc9)qXqPl2Rd;#SaY=)l zHWe6^yXNoSuhaKtzG7CPp2|n!Fkk#%v?cSH>+#NNb5Fk{G#9)l;yK18)8?3R}A<) zC{|<_zl$A_VDv&>9U;RQZ3&Mx4tr`0LQ3;UD5NVl`#n~Vzda{?+}_#B9d?I18SkAX zmo#b)0H1G5N0hd3Di!UCwiYq|K&VAmX7PEf?m$P5|J>dg=MJ00lZyAQr?$Z3z>Dt& zULkf300#U5U%=4^e>eIFv5yP*$5nW7FZ(uopJX8Tv2V*|i+lOIu}=&uFuHe;?g6s| z8)m=a_hC)Rv?~|1>&SOl4OTzQhDHs_W1=UA7a-7V8HK90*-e0r2_6}rz5^PE z<^h&0&8HkW2u7cOo;wEQc9n8cIs3Fy?>BfZ!nU{`!b4Ghb>SRt>yq35jr89qDueQ~EVLHUH!8TXMPg0mvU5Aqj^WE;^q3BtuVDd@{zC^S!WbO`8laTTwW zo`!`-eU>YI!iPev2zNb}nAPx${_*ktY)<-$;J${C; zr3h~N>UrmVReA_vq!h;FE$(FhK3|W8}lTnMR)@bZ!b32(^F{^{__BKNUer&vc~Q$}B>!D6SU8ga@Ut-5{@@ndH3u{sj6X z%Z-ViZkQr8#+jYRw@qLPI|uwi`1+Bf8YA5~!tfKn(~I zYN=XJHrz3rb*Ff)uE|+%PbS-(;jE`N1=avYRmIJGwe&Ffa9-ytCZlkpNYK|j%Y)p~ zTlh<_^zhrCMxBkta(2D+3hEF~(h3#lu`!7oySt@V-bN&s)uG)rf4^N5+O6y1)jgtF zw4$|ZP+FFy3q4~EE-|8YYQK=5Dx~@2GXCBCHog-+y*lib6s@V)8^9l-k`73wjx79) z5NBb->0Mjuw^z1R?x^3=8J?Kn-`*5S+V||XB_o^M>(-HePZS@-zV|M0)P&%4;>C!V zKg83-Ok(duD@RzU^n|A{`sv_5)Ll6&wiEfC$uTm&4;XZNBfS$|w=dE+vD}8eUrV%q zqCc7n)iu~!dxGt=-i*CF5=lh+Ci|l4P`%Lg67nZ(u87+e^0;Gt$@rk9Ap%>q*%F|~7-7dBS+lrU0uTfm{wb*@ql_T0I&wgq?sLf06T%;`^nx?&7nh2Vmrq@^K9yR3(bVwnsaR}k_wdl}<HsIgHPY@nOwj-xI}O9{eT8b2Fd_ z#l8-)3}U?PC_w>^c9sz^s@e89)p>yR$kaJb<1F+rc_f5#g`mT^HSFy>GD50YeujsI z@xbJ0I6Ow_SlHVUv05V?USE6IY7MtXmiv-sV=@_xMn_s3tu8*`&P~SSlR3AVwpe35 z&B2~l8?k9~Pt3|I+|7;N@|p4R?ScA6oa&NTwzy5_k}k)*uVDk2d0?!}JjD}8ULS$) zl4JizIlLJFr-LX*78gm(!;p=u#5ow+Y?N{Vp0+F52Q}f{3t2ryEfUde99bf9VNuBDfr*1;cc5_=cdCKMM(=nI#b5@ft(+e8WM(JnRGdf|$ z&z~4j;t<-NQSs<$0PQe{BIrur8i3OR#Dk!u0XaQ#wBMIq_mtLwgY-yg|E)vXh?IOm zW+kOlBLsILrE+fa6hbkJD{CNPL$`}7h?iXiP53!?)%wP@8?AZkWwyL+HRbJj+kSid zQ;qu@AMLuX`+j`7uj_jB(MNgNb=Lts*j4NKA@;JaA9mIKpaO6JEW!`*LETco@V5dB z!tNaqFsvB`7DKsJqV8cCMzqAfX^LM9ePI>*rgE&c(zjb3=bn|_O$*(#^b#f6Iyf}C zdiChY^z=w5oeqW5>6$%T&)B{DjIDdJD_5+Tnp&{}o>)+KJ$_&2m*Zqo02t5rsGS3p zpOHdQ5@o@>aJB~TTI-LSbAvn=D>u~_E<`&Klo$l=4tR3p$b-OKi-4*}p5B2=6~5eD zVmxV!1nn_n$T||~nP>{q`!H zWjn&YrU(>PU(}umm_r_awkec#rI%W_IK9n*KrkBdxB^adz#Xh}hV8*rT}4~i+3Ia* z^<&OspxY|YAMd4N%Yk{Fin->kkWEJIjS_OCix|EP3{Jxtp>9e7ch zl^mitB8B+P(>U|r_gr`PJ-1DEUq624>eG`uclwXL3Z8Aj!ONJm2K$e12p;y}?-k?{HYb!%8hfUzA;0>MSg*>9OWQ42i87D%?7=eu!=^Sm@+~@6x*=(^6ubRe^$yh9v z;*zy>AQBm9wW?`$DBnIf*q$E}eMkA-JSg2Q`lek4oxhf47&#R1IuzRX{hfZlU{3_i z=3v6Erv6yWkBi^k2p_Qr{`ST|%HvM?8==)&lF61}QuOO!J8)hm0gF5@WQO2+Mch`A zKZ8^i&TE42=`mfrkOk|QGzl5%uqVkMKo%wObvfCUq?f{m;~#Kx3>r-)<6wL=J>c%P zj>du3|o7G!EWnN zV$5U;jXmpWYc`ph+dN82awu24mVZrp88+3a#9`!zSJtkkG_>cMv_(w&NZ4k=x-fzF zNGGUIHPIWq!phs}!nha1vJg6S-onM=Kuk|v@<}+LuzShkrF2&QK36`PY>)OY>5tA# z_NF)ZLcXbFXNLf+9PUkzIHek=Cl_x{2K}kA_Q{P^+s-I!b$7YKovBDZ9EcCJjm%YV zJ)MKlHzc2?ZkreoQ*a>TglJVNMdZw;AIM3)7x``LU>UmghHF@6F9Kt zvEP z8=E4|G=TQ-&0(l`xAGi@UCF_K#=@0@TXf8*7K5dfRJ)DD52YZ5{2V03^66NTQ*gJ* zDnD*Quj8PzqI8iE%+jShb49(oL2q=|uUK>2)wkYy>+~(R-15;|rHk+Mj|77w{yPf~ zriRit-IN|m@j)6J^vX+^x4iZ&x1!Uup=gnKc~5{xrLf$RK$oIc38XZ0l(rx~K-LPm zJ?V@E#jj-4ec~^Q$IAzRlz4m?Ga1U|dpT?ugdb_K%CiaU#b0i=xbWf^np3hB`Ahya z9f_&lXysrJ=RJd!v4NSk#0p27CF2`jT~jC&IDhKrwNw2q9gfxUHvix$J*{}RN@Ybu zMZB!%)S*DapK|z5U*Be^tEe(nrq^z6hII$|-&gz%e;9k9a_q7?Alm|<3#p?cB;g@> zXtaKej#PU9X*p6-OEhWpjwdUvJ0ae^NbvM-UVgifveYo3un~3zFYg%a?|RTZ8P3rY zjLKJ&lfY{6nbfbiRM_yG)X1bmUdtFv%@jdc65SyU?))q2o_4+}jAn?l!wcEapF zG+TxAVfY@&!*?J50aCK}262wzkD|=|I4LNXIYpE?%s*RF=FQ{EjEgddIIVPQ2YpFz zi!x**%I#b#${dC_mp!H{SWVn-ZVM+>{%!H@3P|pjDxquiucQl~4b9GBpC=U!S(-w|WJ#WPrDG1C!|e;CqasBQg6F}jW%E9C+7F^-KisUu zt;2;+@?C}EcTsk_*vX&Z&jY_^m7?0ylj;c}GeQ~kauyox;>RPyc;>2?Rr;r6~ zzcj)>4SSJJIFm=7c=k$ZIlmsy;24;E`j}wXNpt*wbS+>n%$K`I^6)*j z$>*@<4D65GLhV5geq8EfL+H0e4l1guhED#F9K`FPf@iPWFd+T#qjH`1OW$ExT?Tbz zf2dBZc`EjyO|xUV%wDwnEwp>~!gdv2677P?piv)Qh?z=%^U^c7g#z@Wc8@i^=D- z)wn8?l=V7owa7{%iM|F?LstHk=jUwc`|RVoEJhK;IPe^+B717Ycw`MgrapN?z~Z8V zazjw;?knG3ev83o*k`!M@Iu9=il-`LmA6#stEQ`^>Q&YIs~@c~ z*NoRZT2?2B-&DW3{=WLx8+JB)$7nOIFm5nzH=bj>*m%Hrz45Ka^2WwS zPh+gHy>Ym4MdOCX?TzO&Ufg(~@%qMF8oy-fHeF--jOljMy`~3EkD8m!JI(vdmzqCf zzQKH(`JiRHy|=ORZ~+_pefnZ-Sh=(zxC_ZN32g+ zk6K^0{?(?pU2c2XzSaJ`q^%v?q>HvPm`z9bGqj&&xM}bJx_Q8 z-gCTHdav^y_8#@V?ER}x@-_G(zCqt|->h$sZ=df<-)DSZ@IC4~>X-b@{z3mn|Gj~R zKrGN3SQpqExFJ{(><-@7+}ZrYmdTdsmW?gjTlTj6Tgzjiy3o5qcZKc^eLdU|UJ*VJ zekHOg@@TX>`t_JOmX3ACmc};5&Wc?cyDfGo_RH3$)-N^0S|4nEE8Y;Fj8Dfm z#<$1!#xIQTk6#_XA%0K%q4+cLR}-E@Z{mZA!-+?e<;m{kyON(yK9qa~-#5f8^O{F5 zsJY?k)9QQw!YXwy5F7mXQ-yE z4N?!wNjs3%vkm+eq`UCPe-hUfxNgAxK_wkS+Qed#jk%=D*m_9^ zA<)RI5-cG8bg?KoSpwa6ORa30Kf;noQ~Xty^Q2ZONx97)3<6C%TbSnX)@s(U+d>1pnG=Vm0j3>BsM%GQ^7GtJyD;LIG zgR7gpf#=BHz^?3#k}=b`kGpgefDNJy#$I}fu@f!e}UU~T-1%!)b40v6&>_x!*w;T{kX2gbsa9) zrR+givN)|%d_S&l;rcNyocu1n2N&MTT09%qWw_p}T(=^n>rQdenx%CD39tKQ;ZN8g z{#$Xd*rdNwNCVuQ|GdU@{QI2VZ@{Dj(k$T1nfQQI>|p1DV%LMLvl!L;U^1`wC8FJpz2MW}j!bushkK>>l=Y_Al%QkmWyOAH_5HlZd%4#rwyX<9~K|jIF?mT@8skgYm3md)WnSC)>r|#dc#< zXJR(af(3C7JD2Ta=dt(TEwd}}ZvAU;X6!n4E&BxfBqM`9z6_qaRkL5={OY+wFnJHL zQ8yia)Sb2|0ed&@^NsBqJ;*oX4=D~n%#WNd?i)X-YZ;%O4bJ%v_zo=DdcZgC+qq@y zL4Auzabw$oxs>l9o0;8(-!-%TgM)L<`Rum2xo)(hr*=>U#ShG(g?A|}AQhn0F%&9` zFY_JLg;ve3o;`T!sPo|9=$zB<_l+HVaMkR=2S=U$xjB?7pT`s!zkioa!Px+u%VW4- zA-6I!dvMTskj))9KyA*<2K@&wJ#fHz0OL^pKExh84#3&*fI$TSN}vr;V(bvVbQKyy z67)L>5cCKAz;kXCeOJbp&CHGgQ~z87tkKHu;T)%c?vW(?-Y<=|$NXki(R#mbP|30T z`Rb8evlT#gkG{gtdXUM3T6S>r^z1=SBRI%$@X-wWb{cb!|HYx0h3tJEdZHXxKQ26H zBH_IRI8#G*J2XA5WIZBP^vs!(mmrHhN?r%9iYs}2NtrVCL2!>;w;VCMx0HMxn}m*^ z0Z*L=E;|G7!t>#;E#SIyky{1W*}!cZo{>He{I~^wx8baQ8s6kIB56awd>E$-dKR>x z)|YE1j;k-%S}E$SL(9b5yU@#7=&!WxRcO-(s+_1qTJ*jXwe|sLs(b!??Ib+Bgxi_G zb~kEMneD)N4|+Kr9>FAVr>hI4(*FeBJJHTQtj}&p%oJ8BeUs>8D|$E`{Uik@XX4&I z_Fk0RhTI7r@Rq{BQ(gFWl7x3zVT<^n-jInVxu|UeKfYi{W%vw-&J)4Dn|V^e~uBo#Qwnk2wAlY zl%}zr1xa}}bX)`A6I3M`G^Af#~s(z*&7^FEwcxR-qm^8S15n~=D7KoU3b za!A^*LMmSY-lG3lsvml76ZBdmI}KLQ3(!`VL%x3)8X(BZxdEp~D|r>K<~6()Uj2IZ zS#}d|;6}XP<{MaPm$B=4BjQ0{=O%ax|H8=jtAq4^6$00X_^cn&cL;NP8#hDWe-s+x zSI{RD3nX5OM-v3B`#X=GZr{j}}4_8HDQ zYgalwG+J@?S=*B5p11ehihUQHEizU6cAm3MhE;Aq`@C}mu=2uf=bW9~de+%ziV7k_ z6)2-rpsZYha^+h@y>hut{n&ZuoK0P3GHrRe>tQ*~rqk7g3ew~mTlR{3*>sx%Yb$|e z6j-JNmQ`Tc5?D@Yqf@!pS#obkfemS}Oot51bj-ujL+P?z$$jVSmX`^=T^`$L{6P|t zKJ>0AJyrq7jQ8W0xSfMjci{Id@FNHRy$8SV1s6(~p{J0i`c+s*qf8ndU%rOb?b)*L zEb`)0gXn?oYk8ci+`a9bvsj({i+gmRPWF(6C9x_#iNEAGXVqc#?SZtt4V?Wbo&#Gl7XY{dF& zW;YdIXJ0HH!5TDU1yG4RAU75N3h37W^?(Z5;(r7B8dh-?>P1j5ixPi930k{()XNrM zMTs{6{Uy5->6ZoV?8UcH=4C+s3P=Lw?8P_H2bCk}Yk-CzkG@!ZnB5_2eg{~Jw&01p z16Y2!_-l;KUOWnF*ip(^`~}L}amR@(k5(jLW5DXMixNK)oq0(w$DsG~1FUwpLquv}Y(YpK8u zZ4#vThFS`JysehOdJ=sUpG8`NJ$h5hptOR6T1QTcuTVS1H>p-h+bp5w<%4t;=O<$Eq<|hPw{EweppH>RXRr~M--l)wRw(|>z1pS zp*QU0kN-eI&VS@K)VY$uL=(|I_3;K#i9QNMo68dJK>4SLk5KA$wQm)_(%$3}^ecbV zvSKFwN^Q|1I^7NWL{3DZwS6 zj9>O&$SuqGqU1B6-48&^CqbE?6@Rbxi=N)XT}TwPC}a8-tpu?mUM{{Q=HT_>9|R^3 zLDwrEXh1bb66cu{@HffPw@G5jA8kY`L`{q2r7HPQNqJ?J02gEx{)TJR_8zWUd<*Y*G85N|Zw7&ll=N5mWm49bBaP!Nc6-fz4@kQisSXdAC4n8CUi{~GA z=a9H_bMY?HfG7G0-S7suf@o64$`no#(nMa7G+Hs!&!A_)@p3zY-m>&41HY)$EM2!r zluY6sSE_Uf6dzM@5Uo<5_>ksf{eUb(Ke9||ht=VL?H6FR;08f`HN~!x>JX&`UaSRo zO7H@dIAMOq#G3jm+D%gp`9snbWlCx(Zff*U$^x?z ztp147z#Aia8(Kn{OKr8vb?{qBD_i~)@1D0&evW$caP>Z=#UB+fD($EA-r_t-6A7}YC*gHMRFs6-3ZA!*$Pqkih5A!t!YQ{*q-on{JIpqYo)6e zSCVN8ifR36eDVt6E!UCh2;2f1AK|Xx4Jv_oLTTlrv_K=l9id0nTPIF6St;K?ex?`K zQfPv)&13kax)#K!-&XsTB@3P;7ZL{Lm9@CA%~HEU!5e%!-}b!Z5wr95ak@33;)}LR z)}z`(>FAWz^tM9J1*J*X%=akh4xH_3D_Tl@ypz?Z)%ZWkK`zo*WPMpYRQwM}Q_`5E z@n0vojXdPm-~XTvecu6B{QY+R|9H1_rU}2|ul}c4D*XM1MyKL6#m7M3d(i67alKGH z>z%ZXeY-4A=B39wsrA1pBXcm>A;tfO7XI>}$iJ$UQfn&pvB#ra@pp>UdtK8WB_&st=xPR1eN3(UCuIexvV@P+9@n|R^9|NURZj~+jY zleMYNhIaoXw3)XpXMs_}V53~t5uazu*%6)}h}ifHm3@akSAJjJ)cHZ;K7 zS|cJlm1vV?qgbOV78S3amDP`x@cb-wsT6 zAo3OwG1ErG+V-KB^T3srBEDe+|6Ku|qH_#!M7j=OgdfJ&jq?m2!K{1~Uz~fv8HfNP zeb-==AIG-}X9=!F{uB6Cfupa-SU-htE6z3Cfc(GU+lmtsp9Lju!q<*C+$|XWZTKc| zD&hF?QR>|vdIN`Apnauf(Hqm6Q4N;y0M hfvX&`Pr55dbYvLauMj0`KxsVdETT#D|HE?@{C`F>nFs&? diff --git a/www/bootstrap-3.3.1/css/fonts/SourceSansProBold.ttf b/www/bootstrap-3.3.1/css/fonts/SourceSansProBold.ttf deleted file mode 100644 index cfe70655495ee897d744e0447204bed5b6dfeca1..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 34908 zcmdUYd4OC+wRhF+p6OY8rl-57mzmysx~KP^?&yvya}glCe!U;rIIUc5K-F@995%6TjbOjK6-~#e2QA zzvSB(+jw!YiY?nea{eFU@t@*eGh^$< zw{G6BX)5uJLuh(0?&r6nz;HzOS+u_!zk^$M?7j5y6>b;qKggKwiS4`2+hA^u#Th&2 zMznEk$A(LH>#C)>_)Yb_J2&ju9Bk^n3-COF`!DX^wP)}4rSo<%_92w%I(A>UdH3*B z-})TxFGc-@tc>9*ZIo^TjODD7)iEpE!VWVwyar#XrpHjLzIQ??kf=an`re62JSl;! z4IPtsPR$vna}`SNF;>O+yOXR|`HhC^A7c$DOShSQCZ9QM@|g^_6c5yKa~}_Q_)@9i zc7H{0Rm=B)Y)pahDihl|rODySjI6;w=AU{X=3VMc*UHR@3AFsn{Ih9(J29!~Obz{u;kEnoT4Xv`ul#+ddpJ}KXnH;cDL=!w(n@`-t$@Mx|1}Rpy*=2)(zOK%*{gV zY!$j$bhQ#NRv8%ZA+rh)f~iS>6J(9z7tzfHfDW@Da&D2cA{UZrna#K*tHmf8tZq)% z7&m9~x%N+O_GTDpySSci&B8G&9_Lg^+dXp$*i2KZ_O zq)o_KWJue4rEI3rW=QgY-w2o+vzdIsX2h?gl+3LBa9_`PzGaTA-`^E?teV%_ZC@7I z*3-9pJk94W`{B^6_ZQkW|PNdVZ@yh|5Bxt<|w60+emQ$gdMQM!>9s^Gj zHHoganKX>?LZ(;BwI@ME)8fMmFI|;Pj$btI@rR;A>87UiP_$XPF0^Fd`1t;1t(P>m zE$!-DlCn%~lxc)9=f49S)qqIhwOLS96OF1BZbbh&^gqcAXrNk*wE@gmCZMav-3l2x zpVep0S_Am@E#|jP{pF>Xc-_=F(slbke%USiwZ7jJvM_kYzALHk%G32-IiqiqPo>Ae zV*c5w_g{JCAUeBs|4F$o;)NmbLO{cF7B6_HFVCsG;8A#C5^Pe&JfhboVC<0bJS~6Z z0=cY7;gRg>i{=h*_AayMqM^Q|3^ z2^V~_QjE|1Gtx*KpGlBP9hFMJNFzl&bC~I$fs(-0@C+!GwPpcdfIf>4zI@Y7FN0Kn z`OC?@yngBgTc>9i)*L`q@z3aU{-m`sw^XEhjMqNAQwASbZPnzK4{KxeQ5P5nRL z{k^xo@cBhRcj}M4dg_CzOSyT|Lkc|n6~I%b;XO;16s8k+OEL##O(Y`+xiobFNO*#T zL&oi^Xv@WRsWhC`RyjdlUV@v83S5e?(3Gf2&m;y5Gp4|;emZAH?Q&7ph+bU^zGhpt zKx3K%Zx=Ar1u);abuJ!Qe8-NkKK!B2UaK!J*Xi?{x;C}zb>(IHYe0)%U3ejHIl1?D z_Rg*j`>iKW-fHjY>a_n(#f5a8`LB$VG78!_nF$wj2`;5vu7^6J(V4`o$(UJ#JIQ-E zAlHQhZcYH-dVjyZtoAzP0x-XQWBZkzuY=Wxug~xAd;?EQVxG7Hy1@+LpVq}y)PGe8 zaTW55k)yfcFsp)QaEdW3!(>3zQm3`Bn9KtHa?BTe)!ZFpvDny-x$1RrY-|vzCbi~@ zrAsegnMkah8Z?6J;ff+ts8EQjI3=x``~Mr_H-?muCul+>*^TKJO7O@-0^gkgEC(nX3fZvi9%(t3P=x$$rQ6a2*pWT zhQdjmM#gf3&m={6@OYk{aurx6U^8 z7c>;WTvY{nx3OuR-$=x5ETMLi3X()^bv~}f{Uks*%o+g}*--$`MQO>0*e2`R1; zS+Q!sq;AQ>WkZYx;gZ10NHS6D2v}D-QZ0@C-j&&oUD1W!{%|N!*A%plcMtpe)^_%P zH1nuCCf#<+6WyCFkoDT#IJoOF!=WpC3)$iYb@&s<9-T9!`60~b#-D-(Y?!M=iTkb)> z#XkX`Ec&fw{b%fVmKv$0fvcr~qeTg0wSsGOS+kqlvb`LNR~IncF;-`*(;Mx^#kV~1 zFuHywzd4V8JdGKalg`t5(XWqP{I~aOp?)nT9OR<{Ux|XXQGrc^%m>IOA;uPF6S-#8 zR(V{5R?F!EI(g|~&;^XQCd!TF`YLnP$mJvW)*EUKiBIl*tiPhROkZAG(eo`}_0#N@ z_Vz7V-Zu5q%$8j4eB_{*TSJS3!NsAe=f&7ogT`^->d@v6PH@7?n4Z#=nL#UXPz^^3 zYIRfqg+xRzCr%UynNdU*EQVf}waN7F<22Pzub~2u-+xa>b)!*VZLMnm+`W7lWCckoSq&n+#(q0n&4EmLdXBzeG^jDLW>D_M`qABwrAkw~+8 z$b=A9A}mB5Bo69Lk+=f)LF72BlOXp_{e@3X9p!0cSve9Y^&;pniXa#w>mNW9yCk{%%R&Rf>J-w}K{pL%nb>7jaKOeGQ z=W#lNmL=T>#@5vN!glKhS8&IksbksZfGv`b*=>!M)zwiNQ;7{g&ooNkfu8lTkE@hb zG)==au8LKrAzx3-S6{-7iZU16NLE?B!i})YkUPu>Nm}C_X7$LCg>jgbBPWx95cdhh zVaFQ?V|gh}nj0&A#f)wb_zeRG^{&A{VqUf>(6zADH|WyW>^W#@HHY%6;t}aP4=!@L zf&=S1`Zo;+z25fg8jQn>uTBvEU`)S@F>Ri;Zq|^p6H;~=DOxvI3n=Z#nFMSFbzMZ0 z`^;5yFgkipHo3qt81UzN`_fJEhOXe6Nc+Ux(EGg`<_0{@vt5e@1{O6M*LmH6xf^8K zhXK`_GGWf6sO5u_Fz;XCwnjm zQKX*}mw$ zlY?!}KyYw<--02FY4T5j->m8E(#T7)rX2(}K4Cvr=2PQ5hsi>l#FF5ebfm&mOh3i19>B9NZu%tV;xKZPE6(Ea4*mjHdl~s#zq^TXtp)ECngTgookMdWIS1uw6Mw- za_^b?IKO;HSyOnV-Ca`-`s$d!n2-#huMyVu61GEyQ<)Ssj_M;m?_=efos|a%^a)f2PiH^w2e<%ae`F3EGyV&Xz0V*_fc zJr*{?L)O^Eq1eR2I4Q}lGFh%Z+nveuhg-5vZ%xxjMlDXS-5K$BENG4UzPZFu>CTNt zT%M{5Uv%l(4dHp`_s17@cz@*zhh0d$&8~pcRJYN~Um`SwUO9BFNhMlj9;q!b~O7PdyE->h+-r5+VKWLo)I z1SzXQDpGOsvV~Nf;&fG194U2^%$ugbz(GUvg6y*S2VLIgR{KF{vI$4*L+4CA#eMl! zhi&R%fR)22|62MP^imy5sL&~Ee{FO%BarL@@I?%^01UtOJk2APas!0>KubE^5=y0Z z!NbuJ^ZTPwzdtsAsvgzh&;3cUo4t&FOwbhtwI2m(tsljz1s6?1DjLuaJTXAhDEI+u zZN=rGDDP4b<{mUfhO(YWowKT;+GSfn&>-;>Q|8FLytkr!yG|d9N}VcX%DA{OE+u{u z#SNlCG;3V`X1@sH0vIx3E@ul_1B@m3MFwurf9|fY9r^t3z8j?POzr&MQ&TVg)95~e z1$wLju$1_M{z}&~P4P~ys-@h(K~rU!p}e7{#Sv=v7^Ux={DrMS+EHe($9h6!^MDuO zq4)r@d7C;4XW~VT2#T}|og+dBvkb>lzdJdHWSf|rY?PBVQq42+A{*`&45>VE6EDk? z2Q6Yq{Sv{*z$a(2YNiN|HYl8p>i}j7&q!Nt!0el!S-KGX-IB&vD0z^d==UUIt^T$P z*2!$1o_d(L9T(z5MHYd-g>C-Z@z-QgnH@`gEQGEsoSI+~GOA!I$jlH-!0%n8NhUwh z=T6KJOtdMHeIa!341de4xlJ>MRie^NMno;0zsOan+Ig}kA=o;&CY4$}*xEX{I+a>8 z*m`RsnMmSaLYNn@D0<1vpzFXQGBg&+w%t6b5%im3+bN4ijbRisS}Rc2uMlj7f|}ck zmUorHH#Lb?&BFI4ugzr^AuCU|G>C2F8CtV1Y~(wTNvxT7CAQtOWL3E4hZFNM!n*Tz zJIiF#E*1@cO1hV9in*}u&KnLkIW{S#9cUje&f^~lJOk{bDyPh%y}}0?o{HI|;i(x` zlW>8^))OrjWs6G1tWFuR!|bowP*5W@i_bLKH5)3@D-73i$6WvEY$%tv?c|zU7uh|h z*ib?y_zl3dfh|`t{m*qmDPkl7vRO!$N9~KUOQQZ1X%?ZOaz%Wb7KN-$)pn!3zPZN& zv0a@_mz8}~uW!vx9VI!nLLYt}Fr_u$j$#UF#7>aSks#Yz^X(**C>xnZ%>ZB$iytdX z2u-ZAMN*pfpDC^#^6c2$I@xdtg;)D~y*{_e6*SwDA$wD1B-XLYJGZIbIj6oUV78~i zc4zydOxu>w%}!^drN&%eTTy8bq&)u4R$JJ<#?lzBF&S$Ol{SBy-`^Q?gghV+XC~mZ zQ`(Ca_wX6%T&ikFpU8F-6VpBxez;mtN--`d%0Ldwa1lL{*KbO=Ew^%Lk!jy0mjqlj zjw+iaA50EJ%rNZAKkn|v;Y0iws2&Qhp^gcgPst;$)%Cp2<)AouqmrjZ% zz(-Lova~Bjlt5mrD)BDN;UY8$=aI4=2<5sDy1mVz#)GuloDa2#N&DCNR;P>4o2nlU z!DIpX04qGVya-rl`;j!BP|RbkpmZUl`H?WkXnu@9%}xE}d#N;64Se$M`}v8tTNa1I zi(B3n#*47ir4#6PwjW9BW>&w-Kx#E+O`@fXk}@4)0NA;iGdZjTL%Br6KkAmpquLs4?gb)rR=J{KV@m^FpBof!D=#Ud!uK z_1_PSw6=}}z7N{MSH|B3joElEAUy61p2~B?x@^ zhCAa`)@pr4Lxumg8*jfeU1O`!S6V8=w{hwCQfthLe@lzMUv7;f*SK8fhhi^337B1M zM3pDSU8BLQs41;Lfw^R%QVYdQj;?eYXp7KVAD`h!GU~`@Docz^)^^dd!Mg#vkRh=45*~`jy6W@~I^$6gc?Pt=! z`kVYr!nLc*T798s9^<>8`Nh*%ub!d& zwHf83)9t)5qkP_U`P(zfFP|=dhst5|{{gn91OByg%>in1$?3<3lAR*o>xd@~7UZ&XYOE9#k1hIOz>Z1gCz`f~96z)=?v zN|S#~ZwXtXl4WY!!$Y6tdH%+qfBtiB;Em~XV(b24|IIhcQFx*uVqXE;BLN&~{bOLq zIg}F0#l8SR^9qIL-qV)9%1>YZ+Kh6dt=!Jra(NN^k=V{e|GEIVI(< z%H_r5DDN#Pe@!X>Ez0|J)V|!#+e$kW=UJqqu{MeJ-{2?__`WM$A=+t>`{k=nTmI@9 z%3qsNPVLL>yfLGk;E~JUrgHcjT8qDsZj!zUOzROvyGrGn5KZ-=5?{8adM5FlgM}c# zvNMEsT!a+Qb%l~U%tBxldCyY4QhO2@tM!_u%iPnsR^@KGt%WA6Tzg8mQ{ZE;O~-)3 zhA>>JvRlPgu<;6iVsNZ79c&*QGnDg-oGuE#oip0IXxQbW?D_NOF1n$4&v}X9I{(g% z%^54tN45=6Of$W>b5-m@5sJ$#?*d9-{UivIf&5r7IjmGEq1d3B{FJ&)$u1_VhxRW} zq!T-MK$pXeBAtZ2>?v&$IU~i2$iJnE1N_%wiQtyHATZd(lgvz9HlIK6AJ06)`PAUZ zC2KObHfKj;Hd|~o+sx;W?^_ZQyHr}2?H})2)@J2*B02}&5pgELJ9gkfdI(F0)0Dq@ zhVs{DloOB0?Yu3Q%P|AdK24DZ_9`ctl(0%*(q_=B9`u?}>7`7&8oiW&tgsp(6rc%t zoMhfG;>l(~F(W7@?<6w9q;RgSOW!hi`c=lX9cj&v(gTy6?x}nC$?rIPtf>?7=`pK=eC*SbFY4|O@(+TMKwJ6E6oK&stkqFo=?b<6 zg5j2dHRN?}&sgfub-JU0C+a!8RVhhJUr zf?weUScs=7e}$jE{Md|g;sv>#x8(BTAJOWIqWvv$`|N;de-1>_Q&RqlTwX*7n+HqE zk16FZqdY57`*J&PQ90xRelGSbY_8dRvoyZZ_Pvtiz^!x;3sJK9fhV4a&z9Q7G6_27 zb>6PxFBt?JaT#uIJ#G0bXDB~5qnz58+j;#AC z;iSczXkN6l7Vxq!$McFl}z>q6m*k@VT7ik(aFYIe=dds&uPyVCUT(r|GXD#MDh)KA-t7{N) z-Ojq$hgG>&R+SnqX+kcot?v&rT3gC1ViUBn4O%&kYZP;x2O2OcaPvTJqo_wgPdUCb zN91UKVwa4w8dsoLs1ko8p*^#>D&d~T;*m%)8HvPi4)w20<(9bI%ORr~lF^rC8O?^y zi6_QAo+X9!cwbQ3EoAe3#eX(H^hidciJ79Ah{odZvh5HeDR>upZ=Li5HivCeX`{^g zS{P^!(PoaU(S%D@+n`JCC2YYI15e6p5`k{{_avw(=j3o#R**v&0m`faM~Ghaf+(z! z)RTQ9`wZd49B_4>)tz0Ob=uu_XE+&l+ET-b#7HpPmUOyAL1R;+&y!4kiocOw-tBKr zb$f$tVV~J#Yjn2cLjLZ!({9}qY_gi0Yz|+-=Zc0RO|I}@=TsDOC;SmYzA}n@VVC@A z%3tB9FF!V;oa9Sx=PjkYhSrRt{k&-Z6<#IUm&>WXT>ci7Lj^?PADNPlVW!P!HihDN z(ndpD${(Tm0z9gZO|l3qNQz)kj1l7sZVZ82>%g@UToZ7U(KRh>ihQn{cBIR}D(n?e zV_0g)E+m_p;R4(iFf<#ZIc`fkwFDLeUXaNC|5mAB=@`a4H4`DYIv z)I0nAsfF#$6qFAZoO;!5dsuhTgCjPl>bAAp7JNhX+seM0hY(XuYAa5~)vW227y%k% z8swVW;xLN=L^-Bv#^AJIunb7#gr@Z+Olkb8K&q?9MqzOW8})FF;kVA^2Sr#`9b4&UB^-Mn0?kYu z1#HggcrEaU?)bdG|5|nA6r)kYU)fio;a}>$6Us!}wJfg~WJ|abXx0Nw;@~=HS=v7* zuQsUEhf*R}CGsI$DL5Gu#K5jYvUz&=DPd@X5}q!U`Y@%>D-O%swdiyc(dP@(F3ob; zefh%~(dz9Kz*Zfc#K$`304=V?{=h2uABNaOG!F(Hp_;23av@KLRw>uv<6TX zFk-Ex?FFViBI&l-dx7P{8S?QFx5O*5<6S;q*LYUFn!WbgTD#ZW;I$i#c5h7#CpDJs zTM>z@*tZNz(Ab6M%=o~-ic~{GYQ@07cm~cNcm^4NLAnfU;pyGMN|0HDQe%I0R~N;c z^?*`U1sptG2|X&vwe)PBA4x|8dHd4T z#-Y^WId0Pa_Ac9%Qv>52=dE7oPql@eOEOtkZb7nj#flZJy0ZO%tr6q)YrvLbD^z(< zEC&s?IKdXz?5;_yz?xWGFghKentAqz%!?Xje;{Tj;VMZ=ft*+-&xF2QJ;p>H)w5i~ zk<^^J(A@S|N1(11Z0BAO-_X^ztixN#7Dhw;tI}iJ0}nI@!$GUxR=c&v<}v$P+|IK? zFq>~=^t`1^LK=3OzwroWb&f~n{nt4A0Rg5n zAf)GL)lcf3v{^l_RBi?bi2WzBHxb*GbG{rF4p|=3OZpn8ah$K2f9=$7-+W{~uh`;Q z=62?r4(z_|w$1#CsZXLO8)$zN@CDhZN_#~&YtU&?0#)7E$e$r-Z-bJl1dO!XO^zc~@L3}B=XhblCdami?sv9i+R_qw6w#Yuy{$^4UmpAe8ac^1o|nvZNLj>K&#^;F8IV&2a@6T{1rL zvGGU()(5S)`0E&lI&FXTES;cfE_nxvd~S<$K(<#`p#7dkogwgfy*1pEn0l2@76x1D z^*1fK>LYu5_n$R*(d9R+Bc9X=`|(XdKRc$9X|7ZVrcp3YGMAqzb9u3P10T}l0v;rK zl0zFM;KpWf0&!{LMb-a6N82!=6zG7UY)BePH%rOO8|5G&QTpD_)|Rw6*ygr2UlWc5 zUD57m`w}f_cYa|!HZRkh@g@7cT`RKbWnI2+L{s5btJ~37YiYkbk#0!@Tf*^II~UmX z&7;}Yfu!A$7zigv8}*K{zEFRv$&u_Q{3Yxkdl$661{x%-@lSw|4KNLR#h@1agTa9h zmSi#jd}T*}0y*09gmpSj6{=>kIQM{Qk|H!S&y|pV`M{pBRu%l-bo$)-d~;JWU{#qX z<5HL>BA92Lo3CmPEbJf-`Yy4~!Z|AIv@OwCCrN6Z^}r+lJN8xJV^?KZi&wztp}|mh zMFEPQY$%kaw6rysYYpeH-HOgz_CoD^RrvZ8Q(4(}1Ogzwfi}n@z~kBmt7M_GB9PCA zGVN>E?6vfVVy&U%{JASGabj&GVB)`*!t81^KLncLigMAojIG-ph*1xejZ4YP%L~ z*I~Y(6??kP!vol~Uyx4>h(>=mv$@DsSMiM2nyh=iB;5}qD+1@80%w?bCrpBJgj5QQ zJ7SeE7)04{8tTP@b>_Td)Z0qY_)J+{bHHnDaW}^-%lvESMCa$+jlLF7gYNc>JY1PK z{BzQ+EdjH~>$EJ0WGvBvxTh@|j;7qx0MgoUgnt>h5`0a7FPu6;UKM~f6C{p(@iVvf z!t&RLOG&|VGE5=YDKMFJx2xplm9v0K5Kxg4pfJ9iE#ez-F7ay^gK9=0G`+lEFPy~@ zwPm2WYpDcU|3L5v>hh;hH^i>Tvj%*>BibnNpnvg@wGY87zZ6 zm>Ro~lk>GiLTB(M;?U(I^P~%GT?rochvLJ%quT=n>nLB(-jir{sAWe0F9+1ZlMMkV zpCJLGXsO(ri20N0(RutXwWXmx(Gu}HVCMeWm+_$!n$rRRp zW6MjQ_{2+FLK~mE;DYBihC~}_v{66Zh5?i%xa9>JIbX=3A5PE7Wag|D4SiC1SZPYM zvAVdGN2Mn)f;Nl`EC;|sahjPUge62^_0KnN{<-wT*vbAe+)d&+KK&fwDL;p0r!ulO z#F%Ig*iGmE{O1d#$HzXnho18&{bey?M+5{!pChyvA8QcG!F7T8lYCN9Tq!1q^_NwM zm%Qi-=V+}V;u2V0$i@SqDy#)@E`dk;=Jx9Jx=M@BZueO#k?oz^XZAGegP~AR-{@H| z*0ZcB8V=iQoz_~uiq~45wf1m0+O(`^%oT|&N_J!`^_AI<H8nZGPkN&&b}ob$1}v6 zG@fD)H3oCl`t{QB4=9?~jCM!qjE$b(uFe5=!>k3-w-0x-AoR1kGtze>ggtb@Ab`eK?%G^0LKam#t1FS6?>P zyJ=oHJa1EP&!*8(XmnF=d=#5+?L8(_Pa@lGt{bwsnzQqX7xm1`3;e6nkAZgpD})ZQ zLP}x1(}I)&eiq;dnZuf=1;3p5B}eKL@L*7E3p9a+*@haV+uFoVPx;CCGxCb5Ag>!v znR(Qc=d#KO3-v)8(y*v6Cu)hF?(W`Xs;;ifgQwbx+?j~v!Uscqh6_pDv^@wJ)g+-2cde}!Zn@^sJh zj8%;|cw&XdV z+&E})T;pnvQpg50Ld2N=K{^22+QaTr%MdOry*+|p{J`L zV}c%ki=RaNz0)1RO{;&H2S`ZHscv&ACNwZHx2G z%jb-Yep@l69cEUwU(FFl z(E$S{d07d`5hdC>LPwcsn~6a=9;8HB;V)I(Hkz}ybS_*QNZWktf-$Gf>@oIu=O&xl zLXGYwcf=7XxUOa(!#` z?auYz_~g}{pNm|yc-hG6)%icY1^#uhDc&!w##-b%f}id9y;l7Gu7FXw4-b$ZIuTs} z#(J!)F>K^62RX_6DenQG?yUk0Ilf4*mtf2(>qOx^kzGZ~d1t)mgbtuWy%%uM*=qS% zD!=AD$!51C?Jd6f;r`JTRr-cxd7Z5`6PoIb<~k}H8|#fj7W@2#-|;or#*8(EvgQVO zfryq0+(MRU?Jr~rGm#eMaLSDKSHx%1+nH!;N_2YFtE;)$x&k^Y1Yer{aj zw&iV+Xj@w}(kAyE=GXIiShJHH(+Y$3SCa~py${f9WM2K1ejjz`!i|mLoEul0jjk;% zZdWM8ugApZ_2g)R%Xw&`8;SV5k%-qv4t5FstiVp8K8!-Z>>ZY%D!~Q+@aR;dH(|Gd#b?-%#H(f5g`A zEF?!(W`e;CrO)*y2fT&G-UTBL$H;=-M8B_K>s>HfQ)3_fk3=q)Kmx2BHruE9v(j6z zoz@W-(Mx_5&yi-aX=jjR2a+7#D+gV}!m^+MF!}z~6G$YsVR2H4>eIdxSbB;xlD17? zxfH;fgqDeN6a#HHQ^p$%g}a8j!ee6_;u`|}q2VBwOH{CIbVGWci@)S> zxczpY+nXFn&)Z_!x~VMeJR&y5 zTW&bcbyIzb9?mxnl^ZI(9b>6EEBs4MA$x18yzHjGq2ypB zPY10WK(iKT(v@a%JE<4Cf?w$cK$z3TU3%A@n0;&*JDf(O*Ii&r7dt*l$z>_&zL>4C z8}+sJ+RRM{_kHFwpE-E@?YHkcC|!1yZ>|^ruA2JQNMYpQL45HR;D$3z*u!-V?6>K2 z)JmjTL#1@gB6ub$bY2wTlH#TPBDDE{t^tY!Ax~a%2%Z8u?KPqJsyxm~frN;^dFDloMAQ$(eB9cyJLyCSHG}h?XG~ zHX$a<&B0(x;91v@e;M5N9&hJZYFW6ianRjl4c75P_5F#&K;5vzRd(*V<*fs2^0`%g zk%|rL^e)?3cHPtoy&0^>iz_j&(>sM`ukD5T$g#FJ@GO6TuU|QJSB-Sf$+b{7ID4Ty zhj|T)Y|L}8wRHVxC(OQuX3KH?KEE7Q4eVR|Wn8Ha_P6SMqRyj5+QUqBHiO5AQQrg+4v_obT$(5g-!;edO_y}AW0nO+oQwpMS#*^Tqe%4L2^h5&v$$H}!+}4zT%vcOjm(K@>BpE>Nuh z8k%je?1jt{8#$1pX-_^IkM3dN;gtc(3gAijB7!gM5Oa&Q zj$1w4+5+kvy5^cgpwLGj{zzv^pX&UG7-Slo(l+p<(gs&dL|%q-ez_E41pN3^J2k?e z;*QcrI(55)!eJGYvTf5#^Bn%)vK+P6`8{J3t-Udhfkk|2|Lj0E8J> z@Gl{TRH^l*tRlp2bxDNM)q{ZLctjFYswCJ<-b_L7T*Vvn5R~}I#h?91GNDf-KO)^Z zwfD+vuDMe5;bJHFzw>**0b%eg(M5h&8g0EIzW~kG^6W(=q$SL~VjE}4>Xvp-xLOv5 zJV`9=t%3SQYTgp8=RF-sd$Zl$+@)O6gOC&OciA+5>%mxP*$1~ParpMByAaMldKh&F zigU#IGaFX$3dI#`NLy-ZM}R z??}6x)n|9$5Xe7@vbUzou9KGXyQHt8-kZ~9Uy_3S8tDYeeluNm2z$!6ViX1fX>igtxBHc-eqE||Dp>Q&nPCfdDwx?Kr<312L#MK4-*hxA=) z_k6Vb89}FlI<}hbQ3ksdfpTyldr^K>8NHoIMu%QB)VX*4c{zRVJfO8?iNI?O`o9e1 z8taV~`_Q1#WVAR4o>kI6vio(Tz$5@%aE4XUT{XA@KJ-NPN)4_Sl25gd89nz|{4PgL zt)*;XMR&L)Fa4wFW?1fRc#!(LSX#;sfCq^ufC5&*R4>P_AmU_G3FxYyQ^at3 zd$U<2lihAYl7fX)svwfnYIRal+kcFGSa zR-CR)6I!KtxC%J@H`|2%q?IJzjRTvG{3o=={ylc&8`w6?4)lwmeRRb4fE(%edgb#q z*hriBz1a8CEL|#nUHX}>TsNlMt9wBo)$i3$mU+uAEPDyZwMWW7R{p+W-0*3`lNG%c zU$6L}a&P6&s)AMDueMartNwKL^EEX!*VVjI8?U{~*l1jD{862y?n8B7uD91;SpWU{ zKbxRuOm0)ulsC;a-D`Tp^tkCM)AOcdrW2+Q8Y&tr4c>-$!<>ephNTT_8(uN@nirT? znKznun)jKXw>T{!OUBY`SzuXZ*=V&`y*OAs$2w$PYF%sHYTawS(t4NmLF-}b6V_*} zFIwMh9BX{Zw$`@Qw%2y0?K<0SwtKMsf4}_$$H$y$=O>)sZK`S7*Yu<2VDt6OPq>C$ z54xUqz2}zPMt8S+qx zeD6N*9p3MHU+})?TkiXs?@8YazIXjbf8PIP|MP+Iz%#*(!B>Ls1mA06EmbXJEqhxI zg{ne}LgS&ep+lkL;b{2E@QK#7tv`y4MDB#ycy=X-=9_^2=kKP-7B>G(R z{a8A-F?L7n>#_IaQoJVK8284b@%DIcd|rHGd~f{v_+9a*nb$nE^+TVYI=8O-kE~MnCb7X!ZoTsJ^7YmFqGRgs^gqx&jk=X!4)KTB z*iw;s2H!|hPw~&vI<{CEVM(lY7ek&GOEpMW;P>5ZF;5_!WcAYdC@V+$Gt%uy590ng z%5^KQaTY*w;NE;GUi_0T!HiOYRZF$S_azq#N{uWf^{@f{bL4wi7;OdlN@hp7ANp~C zTUd@a7Jq{N2e_LJ=qA{J)QuDq^(hZu6Yd>hR{l|DlIE~(oI$G5;jOR|j%G`EzXN}Y zg#tC?otz6XACgb4uILF5!5Z zq-$U)fj4j_yw$`l#Xkb?Ik=ucdKq~QXTtlGq|2l1Qq&>bOA~M>{9*e?iN?~6pvfVm z&tg0fCqx=Saw9b&nUQQr5u`X$6v>ah6+KAF>FYRK#wq=jMUbK>UnJSFpC^vJEpaxA zd;w`x$&d0NYeUNOqqrW$brFk+bd<$(UgW9$3D(Nr#W<~D^N`X=tC5mO9&ug4YIzM? z#aFOqas462li=SEemTw({AuRZ!Dk`hy%exqiWr2P0=PPnW|nPXE`AZSbM?9d?bI_1 z5?#|sHAq&ZZnnO-k`nmNsf)0bZVV|S=;z0MN>pFXmtHd{cZqvM`xxxs80_5`+mEyx zX$R7ENMAxa1Z(&LBy4IaehulHNarK1K{^X*71G5>tCe&Eu9R*U3GzyELb9)We(HB{ zw7v`(|E2y1LL0~eE`R@?>2PN9+n61gbU;GuY@vL`y8<%Yi_&U?4*Mn~Nsk`}+?Qt& zWCn)j4l@)^6{X|YDS)21$;TJ#=(SXS^zx(Yj(+Uuz)|~4M_&56LWMcFF^+^$V&}8%_`VnE38bS)^4|;W zB{e&J)#1eF4cM{uPwYv+dp-LCyPG}0o?_Qvx6{?^E9~#twd`Mj!_RO6>KP6_Dl8) z?Ap8&)ciVjVBOAs$bQ6r3_rk1HV?7d1$gK8BAnxXnvJogco*ezM0Us7Dz=+l!nVR@ z_z=4QSna@Q?8KSJ3)vp{5iVkvvWpSN-Gv=%pJF$$PqTyUW=4j6d?6OeOV>Qi`SlZr zdGV^lY{*4%58b)vBw+K#z24z%Lx=c!{E*@(i29Jz#l0hkbS)#x*90cK2fPR7Z#v)| z@owF)>5#rfTybObfr*s&5L>Zk8@|Wa_zv|?G)-qWPfT>89X+*!M^OF11X}oz(gLoc zD0LE*%Hj*XhjgK(YnH7!bmdUfq5h$XCZEqceCY9|YYsg=)a09(K&|p=NCENX+w2O= z2Ebe%#r+Dol@)6a^*0@269*1Zn=94?e21<)aG>b`@KAmqW{;mzz}cw<{Yn8Sfi^&i z;lupOrDzP7fUk)P0=|F`a83-N@5=bX6>Ek8sc#|y)`+pMWBXN%e_fLB{iqaj+u;+e zh&`%nQF822o^JKq>ru$QuCFk}4lx<2g@@KJUvr2P28S?VLMr!QENQt}Q_Mp5z7CyN zj?{~E1=5X3PcpLG4UkhvvK|pF_-#qHDKEj>;a2iGHUj%oF4to%vt7xTv5$dcXtL^AzBm9O*U`MF~wbFkRW?Rw1UPx^x^k@pQOP?fK--Na| zqKBk_VF&K*WgkJk&B$%X_ZHOIj=S{y4&)Tu53`Nf&VaF<`S*Khc8SBM0k3!qMmUVI zjlka@Lrf=uc2a=14bNs-JK)a)&pE)N6S#I`$K?=4YJ`o>&^%+%B%0<~32LrpYjA4y zEa>vJh=Y9<8tVtpZ5x5Xjlk!}fci=3u%AL({semKeCWAnper8&E}w!xJO@4bufXRw z>@D_N=&x;{Fk!Y6+H)6l*lsbJ7XjakL8D(lm+b>ZE@PMD?By4rk*{SR#r$(6`#bEn zon&ug@2sAScl|*=tk~INgBQaA$88hlEfaiuF7Uh_8rlyHUWHloTiEyT2>T}HfbX&I zLJQvq?Oe~xp?$vrO??gcivDA#Ud(mpV6JOm=fV&7CT6g!q4WO%vqFHC<83|_ypmV( zYF@)@5k075pJR9OdTzqok-r1!yNcby8xU*yHaA1&{>a|Nj$k8ZgcDH0Uc^^@(8vQA z*?V9E3_{mGk6GY)_5x;wm$(({JR7%j2Y2!&-i-f9!_7V1i#@r19^gUVq90qiXpuCy zTzCGt=OgVkT(omrIz2E{v1{k%>le?ZPU$g0SHGzU_^1KbZ z#l390O(|8_>!!1-UF!m@Z2Xq|3G?_g)A? zjs7_75iG5dBP~gPq!aa!0*(=b`&v?YE^hdK%Iq z4UH@sXU6Rt_U@!m0X2vo=)RW6uFMNIU$~PQWLaWW9Pu|xX7r7glt1*vDA6C?Ek1~v$BK8$C8F-1i!T-r7azh?@2jOVuaG!ad|z!_zE@fs zk|p{mzJhBB^u>QyTSV>mR47hq`(0`YxZ^pw2V9S#_OFzF2!1?Gzlt!h)u-`{02-XbQgADQzWDdWUlqSsyq};2*I^A?{IeK?7m+(oZwJKn zHS{-LJXE}~cq9F$zaqk-Xm4-vCOq{5^3N89mrcGaf6L=DW0Z)()1y}Wky1~25_(Sj z$+*h-(r+14rH*Jt9W5%uQ-2`*|;IWbwJ;6L{)*x~u(ZG{K0!tBknd%;J+;Ey}6%1my(J%Xg9-!{QzIK2BVQ>yvnU zMoC`^_a6uSUI6tT1vP&N%1mPBQ~m@$92Xi(k-Fk5==~kg<{fAa8UvNjpMcFf>kswt z98vw$TZ*m{QivLm&(r^5#+~seB>Cu!qFFx_9)xx}^_IX#=~KQ3-Yi#ZmGUWI`U~lV z)BgzyP0PjU>S&tebazi*27Z1GBSCs12>R|iT`kgq4%qQsm z9<(oL0xc!;k*o*)So{mhkSF{xRxg3iuy&LG1ifV~`DZ+boOVyGgEbvPib9K0yLOUK z`A@W}jDp~PFG@1V$+YW)&Cv)u&rZM5tI!kb6{{Qk$-F4;BxlNnn9Zg&i^5^DhfwXE z{D#zSi99J|Ec!40RNPnQJoF?(Mb8kGjwyGK6Xc-WOr3U=?$RIHe?WoqgjPp+`iy)n zKZ~bNkqpuEjGok*+O_yS%F7xFy^ArG?_vZnmf9b|RRYsHsC^VA9}rDcnFF8yyY_^f zLzx0s@e`_z0=_t|md>mX4g87HerDdC{Y!938D`geRsJZxis#=eJ~~}j553`?)tepG zJ;n(7inw*A=9NcF)$?ymw{%M8RJj!NF0Ea4$^-a0&6f%%m+%Q`H?>qe2*?CCtF6eK zA^*Zip}z75Jm`-w!MB)4DR-v7Q|Cd2kIz(Hlq)<4>|_{=UsWYRVEz6ny;iG@fj6e* zN-d+S$}u7@!%g}?;7{|9{3pid{ZnSvrs=tFhBT_rpcOHGN(<0&C=pVtLaf|@O{LOX zy{b04TtlfRKl`6bU+FXdJ9+5HKM*cLZ{Ab)1@X3D(EycoqPt|b6{l%w2-=CmWvgUtNyzp;p4(oPsGoBPY{kJ{y zKdYt4jOZ0TKLXw$i|Rd^yv zROlkX7mHKIsN_eK#RY4+6+ZnaVjzBajxR=JgrXJ~AZBn7UgTTgqovrz7Z4ZtB0g6m zM*Jm28onap$oIi}d#&&X--A^V4)DQmOL3b@v`LX0+HFSd*C2*dgMN*OY1G62W`Ym2 z0sdeM`nLiSIqK0Y0LP&hL_eBw#|4NyfYgU;0oMH-5f>^)PwI#MZ-9{UiJ(XNP;c4? zZ^&0Z4JeJHN9|)r-*)9Ay2h7Z>6v<`j~x*wzw!y9fBawP@M8Pa>Ze?7h~PBhLvJ&{ z`E+=?bBN&NMWU({yP`yqH~Q$r^C^6*sSHof!;|#?loOUl&`|tG51?Ly_|Q8FEGVab zYS5nzPY@RHLgV9xFQ2^mP55{O9m@nBwYcL3^}WEw1X>0_6~c#h@`W%GVSEf2u^8wV z$H#g7(4!6gXYjEClPp?l$0sOoZ2_)%j7b5XD8{P?SoGmz#BP8k z_@Gj=ju2i!i1j|ZpSBvy%C=SCGNz>j%eH6!2TY564(#%WqcFAJHhSuf!+_`(}*a+L!kEwe9Ra> zj#P!1+ns+Uu7Y^R*lv diff --git a/www/bootstrap-3.3.1/css/fonts/SourceSansProLight.ttf b/www/bootstrap-3.3.1/css/fonts/SourceSansProLight.ttf deleted file mode 100644 index 5d8a9960a23fb7a43bf596101a646aa797fb3dbb..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 35368 zcmdVD37lM2l|O#(tLm=q^jiDAuU%VLcXe0w-svrS(%Cn%lZ}v&5W+HHa{<(V$R;8> z$|i!ML=+4OiaLn6A%hMgB4pTPQ*;J!#vxVz@44^2dexmo=Rg1X|305zzr4El-FM%; z=bU@)x#ym9-V5W5F(ZETtabMI#4O#oZa-st??UO!*^4Ka{rWq<{|v5QVa&O8_OcbD zf8O!TD#kuB2ltOpE^F^xyZFWi#&VVM2QK=|-O1N+{}RS@kL})j=H?AsF8C`z*@QM; z*|YhgeYyr|F0QG5;GE5SwuSyOa3kQk3HN`pZ|`{rb}yc@m$BWbuj}2nf7`yy&JX+0*MMFrXN~!6i-SZtEu-W zo>Oy%O0G`HJ{_auMq+Fw+)`yu1Ww{P>&=@r9j6tK$+|I)-+&s*Ke!hV}QX2o> zjeOJfm#pvC4{p4zdu8dBRR!s$6TA6xu0QdCq%VC?`sH0`opl#qxbAbGTZfkGfJ3cx zBj7i(-|NYE?j7^%RhqSMHl1v(9=L%AcYq5WYrNuct0mdC@*yoK9? zhOjwr4)aTrmWWYrj98L?DgD=??CaUrbG-iI{@sIvyZbMWza-swVh?DiW19h+6|fnZ zi-p-4Ds(5&wi=iqo-_&&g6&6vU67f?717QKfR3;raxRfGA{UnFneVh&Ewu)#k6SIx zQi_{93*B9@6t}7wkf2UcRm^1D)t^hLnZtKv{Y^sA|&u$KzFGKFgZSEGQ? zi=0h{uxm&Hkak0sheOSh)#Aftp=fW$WmYP-&D%NLyV~V(&B+v24F&=OE4uTO5l?Kx z%)#w*6MX)n%ht5#{61eax$vBciM@+bi8gP#Gq>h)kXX<;3OYA}LftBaCsA4Bfrr79 zL`kBlU8SE7FcIa7okLQ0R~9+r=FcuTcU~kiZ{LDjZyMV?S8UbAc z?$*iB1+C&R;&(GYtMo%&SNab=QTn8GW8yy(r56%P-%p5nFm~F$>#6VhQ}taxrEi*_ zR?JYG;mv$U=|{Z2^p`9;EB!T5`X?Dz;t4BwBCg?j5>JGwzp%y=%>u75@Nx*O{lGLV zdiDcruZ*kU6Q4AlQM$w3d85KC$%SW+1`FwMliM|?(7Sdx6c}97lbLjU;V1qxM~8RL zYm@n<+3sofdEzR^xEw!^m;Ni5B&HE#CHcfy%{?u>w6Qu0vZ*6f4_Il`h<}bS{ZkMY zNDWVcYI#VsyfKX5@a8PvoXwWL2(p!4XS>47QUv`p{tdaMr;f3-R-~#n#S}4HM>XmQlcTf>uttnF z(NfRqkQ3PDdEQ_S>kL+)De>Xr)9-XYcNJ0X27b=FrOo`3&%UhAtw#Y*jfVG0GhAUn zfwv@c6GjAcCd+fBJ3zuuCjf&y_M6d`lkHV$cv4%n1bJ;0ZcZw2DwBtnNNqM9#b99t z6}UB5az@my6=fFm>QwMG+w(>6N!Zv`D25HXur3~k%m%-V9O}|{9vaE$C4JW?+pg_G zngSIrz2OG_QE<;U+BPPyFI~V7U7y_8R+_Bf;RYV&zcEJ22xwzuCOphlcvN$_9-@gx z<|tNA#>@)L+@8;JVxBNoLK)f|x6K2D>0Ieekpj~8kLEVz_)UQIpFf&ABUjpi79_ED ztc08}LsC>^^9+JvMip@t@{5tPh`BWbQo<+3um%y3F%8(e$ z+_ZZAhE*Ts!{59n`<;%(J^nKmJ;Ybco;z=_^hW8cyuI|#7?$K{`{ddgr6|!r z9>;j(S!KPj5%FzRqmiS69F2y$t~cO*4xk)iHh@Pf+)>E=9J2}V6sZhlqn)b*plC?7 zq#*gZPe&Xt1a@R=?}F9lK+3Vz)*g3x^RwFq*85!EMV+IIZJ~r|tEV$&_Z1iA=Io1K z*p{2y?@#*e4VijZygM4{PdVBHet&dk!JF_}>(Y(BL@^c{X?GXXgqs&X?_eAZz)s;b zMcvoLhO)>2wYDyB2OAbUFvOFC-jk-}QUI(!yq*78Yf8Ye=^cEG+~JZF(4MQ3Rsd2a!0WgCN(1 z^&JPzev5vFvDH|Au>IK%0CD-iwgF$EyWry=#;VO3_IuJR=sULAfP)6a4pO(avs!{=K*#t0%8t`wHy{7d254Z$dg;vU~kYjI-7U2 z?`U>5>l>^M%Q83SFRC}y>FX@@7jy!zOA2Qf@Q+`i!1*@H2! z>~}c9$*YD~S#dPfPFh>536DuFR?nkYLt2EE43^O4?J`EgJg+l{D|@u?ua9)@Znhis z&DQ4K?MEK(Jg?bn(zm*r&uix^_|OmR3Aa08|3T?{rLXRxKA7={YPRW zkY#uBx4|A6jU$y!XkCT9s&{n4Cg7lPbjbXsg97RWm!bRiBaAkpv{gBZVRtCoSK9hT z1z1kxutkBmAW++ogF*`Rr;vqYt2M-jbV4v2!?ev7yFrVM_J-Zfx{;f2i87UCt`QjyCPY_eI0OrTlxhiNtAt5rL-cIOcmS}?N1|yrcx`DPZLwJ_9q(5^h$*5R`Ll-(^7`HiX5xpf1t1hIMHvx;(RKQ>cGo zGCV&d)kM>Yd7j8n+G&jRwM7=Cq+dL>!Jocz-{7XPu-}zg6Y>Q5mUN^S6#Z>6uode9 z&R-VeJ$?VKAy_@yr`o?4|K|R^D>5*d?i_Qt>^hTBcK2IbxbG_h4g72~EW1=YY8ib03)CS2!{Aj8Yh{{?b1Y#ZT z)Ce)y4ACvyP)wk|Y&oGZq1E^Zt3!_TOsr+d1;v=CxW=*NRG2bWR16lztgv5nVK7qZ zk%*Lz>2==8+!?#ut%?3vVs0!p7LE*MT<`R47!CV9s~b!Q3Jm4ekwjg1wXA zL&Etx7!wcpaEZ!?C*fQ@F z7-@Zmu5kbS#L6uaB!sJdv@JgDHhCwyvr7iTeB*)$okdm*Sm5PDU2HjwHOabzlDyoQpG?~6SPrN=7~0H+IHgzvjAXuD{VlI%!Nl- z6GWN;%4#cA3r@tY_3}LF7shaRvAe5~@3eDEi?=xz-McqEIy%%F4ohFItL^RD87s}= zM??Cv=gesZcxbq*?Bvgb#zr<9tI-}6#whVklxZ+dP{9PN)%3Oj+@BD%9)ND&AOMR3 zs5SuChLWTx89+%MC3%$0QR+O*mLiwyu#*g*p0&V4k+q*|2P3Vl?aQE$pZZnuES%ENF5>TJ2F+b|`EKG~Bt*?sH`Z! z)gCMCSh6tCzr5>=UEg(PLKaIf>vT~X&TPo^SVJj$BB-mecliPX4t+z+6Ua2^E#v9v zP{wJfiCTtZl$$Z5Dd2ELyLg%CK; zXtx`2CeYP#o6&5wnvJ#tr2wiksr+Ku%|4HQT9}&^)qWJDwSJVz4K6!My9V?l%N(+l z%1Ul6F@drvsD@x&rmM#oYG|l;HzyqSR)?e2=y34kCw?@0!cY^@8Tzx*S5%;AUecJ5 zJgu_bD5e?>nv=#v+uACG(zK1Kwj1~|FkAxSyjiu~V2%1i{__uYd~r9%;=~_$_`9VS zIKS+ppby|FzstT2c$!bL-DqM#>t5cw$`rBX`?zc)?p~K}tk)Up>I}^d{pjNC))v^O zbPE)GrDrkE1MC)+`lsVTjQ|0f^nt3?LzA@%0a~d>tE}&k@hSkcWkVq4h*yuW#;0hr zLUOAf{7PGYnTI_hM;j&Ch+)oS!$8Ztoql2O5sVBzR?~G@M*@?HzM-b%Wb(R9S8-%A z-PMC1etcfEqdSx7J|Z*s+S1L$<49!Mf&h;KcMIG0-^X2>e+sIaP?pD9o{-vPBt+E7 zs34-^ASNS#k5)}b0rS+^Nb`}_yq5v%6kE_qYo4Z5s~!(pnPoqRyspWndRbE>H-f4v zHA`657Nt^?{o!!`WGc0&Kb&=Ch9Z&SjLVf7j)--cRFTlkjROPgDP2E6+K9hrQG0Gt zuOHe8!MUy+=Wh#|R_Ta})j?w*MLpLFlsz*hxI)!xzfKJ_d-CfX#Yh>2tx#V6WF3(d zXjw-jHj;Hj!dhOj!G$)pvqiKi>)5-g#hX*{W zis(sB)ez;eiSx%4oG({7>7=ny_(a25QMojnHKmNaSF+|sn^IXDQ}wSF;P&_RuY3`r zx4TH2g45_JCal-WaQ%ImQH>l)1X-;lIneaH zY!+!%gt<3I$HYO{{ zAZwMbaw;2Bj#-63vVy84c#g6do*}za#qtjuQ^m$N#R+HkRZL8M{#jkUz1C2h6?P%F zCD9v;&2>2(g{UXtZZZejte&2X$C@077uE(=xx&3MTgYLmn_=^({I2$}#bfiEoGp$( ztJP~W)-~7y?O}IE)E0LOIpqOv8R=}SkQ1k+w_;Ee77mg<HCmG`;jE{DG{dW}j+K67kGfmxYa?|t ztg%7>pn>iy0NaE7c(n{YY4tv7`fHP0VIOS;lXrhLVkDY?1$jNdB7mJX$?D1mrJPLa z@}@V|y&|3OOU+8AvAYeEDCNgXPcNL?p66RifyK$rwQ$xGtd01&8?ZK=WXIAbrLt4f z3aU3oWXEa}tTELV)R^1d;35l9ZUCFm%b&cwP)MAIx+TCUoL<;bn9Z-uqWRKKcw6}BzN)vd@J z>RaB>(x9(1H!SN0RzD672Li)EUaZOmcrrW|4o`$j&k7pD_rX5_Tu-)PX_%ZO3IC1_ z3p%Jk2+D%u3o6E|Y*+?+l@03~H+L+8B~IUDZ zzk_f5<)ikr)ta`GibZ@;j`Di|vxm)6=a-_uX)r6|ODj-duG;uCfkkCk73^!+Hx6@M z72S2sx^O674Aog0G6SZjALb4;xM3=^&)AXq?hJ1{A8^}dd_`9?ren-q++CW_) z_C~~p=-QO{#On^`zgv_K27^!~xXTq#ky{e=rV_#S>v={N7aSLVBW&KtP$*NNZ! zMu|5d8WzhriU|RZwSu;Py+g$pQilPDdp6@+|KW(loLF1`I}S@8%9t04QY+^73^W{&YafM-SL=leo;nH+KqM3Bh3y=sh-`*x1%2G|R3aZ2;i66x zq!h9QwWA--U0BnK@yYWS@mpxJ@Q%{@MdvSy=K^EfCWeP6wv7e&g83J%%*uf}?W-=H zKXNuKwiC(uXAAxjJ~F{q4&XvEYVefhFQ2CT)hXq~KXN;7D&^pR{)lLwmQn+InY}1z z76sw@K(kiRY>i4YWqHuo&=y$r_)+wk9M{*3Cq05{&7hj>|89mV?1P@xgwzkZ zMU^cI0?|lQGYg+MMOl$vZ{#z^HVylH!<)vo-+AY*1?SF3tkt;-KD%T|C9BzcQu# z3zc?Wn^I0PR&M`|DdkU8%HN`L$O^zCy@~xpD}2;T+2_1FydslI*Prjhjoau5UkQ2s4KgANK>CB=8p%tg(4S1 zPPUE~W$P$OiFmV4M;;*AGGY@Z>xxDXbpsn0+5l1vNTG;r44MCG6f5@Lfi`otJ!@^4 z!Dnq5^4OXpnY_DyqS3XguwuPb`j#s@9Etb4&CR|@(iP}R2AgtwGUPbA`EzyfDj{S{ zT0VEg*WKpUAM8puI>I*FNXSjDBJLnJ(nzs5B3r=WOR-zR^{vfyMo-wB?QRWpgchqV zrw^}R@9vmr6Jy_1&XKPLV-pZO@du8`G4O=2_X}PLDZGLe=oIBI@l%(-GNqh<={` zr5vj%`-*6P2XeLS_)wd%2CW-sVaX(F2@s$y(-pqxt%wt9PMfP!i z9GoycZcSq&Ek;=EabTmxCYOw)Xq9Y|k4nVjB zzcQtq+LzmTZAv-OOD=zd%7I0;{3d^czXv_kjCHLN)6qtZ-&VEX)+8XUs~*+{UZ+54 z;{6$@DNDdMaJFp6Eh=XJb}k$(R*SYS#-}ZdpKTwD3};;tOLl@RR1uzZc*t(Gw7=l$ zqb#Ca=XwjS1)XG{TH52z`+Fzbm-O(iz{&!duX;wUvjWQtWYO|?Mxb2+FYuWz1sPyw z{cN0_tI7aH)7QqTNQf3?$xb`fBaGa%vgzF^r1ue4MB0J%F~a=H9FHh-T=swX@x-ur zmg0=Yk%Mj^=B{d(B2Sa71qkD()nW)%<~CV%l&P(HrM5WJgWXExNo zAlbLw<=WV{VvDYHzdJiK5+8D#y%UAutuD`|;pBq;ko5C~Gkt}mTmQ~9TV9SRGkf;v zf&;ruri?s=jlKmVvu4Baw?>_`!agl=={JyWTUB}~#y!nGeUgY&C@P$dP1q{x1Y-mQ zV?>qfqmZHU9ohHYB}il@Czfo(M3j$SwdiSHUp=W#@Ek$Z!OFUB{i0w#V)jS<{`Nw< z-xlu<#K*lhZ+E~Mb2j<2#jM{S@wexCC(@E-{Z4D7!xJyIxBI*iw<}Ue`Z{A)k39(g zg*##nr~S@ACKBmt?+B%PmajeWUo;1W{X@*bPGt^4=RQUGOZ?R3uS_YYxhA*shEgu} zrlS3VX#XYls%T#>r}}dF8&r55z#c>W8{w$Yx_~?$T{Iz z34kLZa=_O)aIx(vcs*suX}zbF~2wLD=x^U7I>QnlGnCe;Ta0rq7#8@TioG+rR@Ru zyDbJ^ek_`to%cxNzPYP*4i0RYhz9ys7CM&o1!J*!yOQ%f{;Uq7z>VQG=bFd)WZ;CB%-Eym8(36!?st}b&uiu{tgnyM8wPt;3O6)-ks_h2 zZEHztBTN?VykZ{CedJzio9FL7Gi;0djE+PxU@!|)aixl$@aBBD%b2qCCc-nlu6Q7K(M)3`o^k}cqgMWIaCXELNu*q@en-p9 z6A#-5qFE=xHG+lqHgj@WEKrEs#=8QA_LOz_f=p)5@c6}fPZSD{#Bz|KUze^Hc7saX zwc_Duu6U@F4U^d4$#3kC-Cg$d*{giuaj`R^^~hp-XWf}+uA_5oa&l~R@#4m>-G1A> z_uh8<*J7W(@y6?}yYWUue{#h0GJc12IizwWnp%ks(R$a|T#aC(Fc3X>RMxPLFb>|W zhpZNkAR@IfZw)TLd4GJ+9=W>oKwL8U43?%7_ryuoLqanC4dCq6V(1iSqSmLT̨ zj=4cT2J%VC_W2?WzKAo3D{2eIdWiRPYp`wdg30*Uob&>(H?pdK<%Z;fJ)^Fo>$%cJ zp2e4+wI(^RG#BwC3R{-sHlB6iEJ>FjxV#vPuL7tT(ltXGQRS;JPdaUR1Co@4YV zgxiGC)??Drdo?86$ePfAlq6UyQYtso%1v8ASTGH`ny?jS;BF4S-~~z2H@cc1;RiRS zO3(4O#Ku?Ow2j&GAqhSVZ-y>nRAIZw@89f`Pu2Yx$gLx7Tmy@v_BP z2q)%r`NO?)=rXm#ed&oc62Q4%1;(OElz(6!7uyKzXg6W zLf5Ixt_%U3sp2S2iXI~oh}{a&n8YS%0A9)uC>J zT7%t@(9*chp6I{N+T)Lnclmj6S!Tt0Pi{D}d0%{FMK&|ybUD-gp%6mPQ{DMx{Xxm< zatG%9!|Jx&w$16e-M-J?u=UW&Xb4s~+L`eOF&-^i{P{_;LX%V!9;UwEK(c`Xu_@-Y zS!W18qIYIz3IeJ-M)OxW{Kq7(R|$7;+;GYoSSsFN314)+7;@EdcGa#$%GsAjoxU= z73yoVJ2Qh3S4T3`pl|ZUIs@UsjLY3VllUwJT76|YpDApm&1Hr0u!bBX&H}Hgd`8l= zn$PeaOi@#}#Y-k21Sunkwi4S!buaXiU@s`!?i|=H)V0gn6Oh?#d1kp_vrYTrGgoFa zqYfU;n!a%MY<|~`c89}mAqo;-MZs5_;M4F! zAC0N-E0!0*Mif{`rdmuYOsp`COKb?cV%hp97G*JO^!93W?yNNi5)ns}C*_TfIo;kx zUD3XT)fs6Enrr%1aK70#*4x?9<+rB-=Ahph%-Gv{f}!57d~rBdjeEXa;O7AMQ^5$_ zkCC|tMwV(A&9-K2=6%)gHG{47@oL)qsYZp-7a4PUypwqqMw5V%_|3^PDv-&bIplK& zvNDj}odB{zO3s$?-?6Kt2QfYkj9i0yId(CQkn-?yp05u|`z9vvK>*?<)a7Q>jj?M{ zV8HJuk#g3@kF(pQM=`=p>=;_&XiHee5sa#F3N5&|2SZYAi_>njI5G+89(N(dO=hz- z94IUx z1g|Ln9dAb;F?PKuzg{gbU&iiW>m>t~pSWGFTfU69v-QvmWV()F+%5U+jD%cDwb9x0_KN^$V!~Y*qalxqiH8w;JMy4>}GVa(wVb z>+La7A8?|5z83Xk>}CPy%?g}ohi?<*pAqGsQN|$wi>RJAVM{~ffcH6QJY^3>IPv`R zyopp?w5!yUYT2yZ^Gql^R%{l+MKS0 zmy{QZQ@EPHUjBvxFO}fkEVM?xX#RRBG8v1BdaKJz*k7=3ZWevkDt*ErL#&8UAM!XF zo*$YuYsfu-KllAxe|N-F_rslu9$ZZh=& zBEt7w;H$w6_Yt5)NURW($0&jm_9lXR22y(OA2bmAN*Yo*G+uZ8zA(b3WJLUbg3>t*O?K}DR>m1SQ8$;mM#SkKvQ4dgmvg~@M2|kQ`Agh zijlDH@H`LmzF6rOG3oISZpAYj%eCyI(jV~*%>|mJB3>K=xiJ!v{`diQXRHS8uK(NZ zn$d1ejCab-q7|)OgVM4rVd!0PaEcMFQ~Ra1{!)^|{YW&Q#h>I8(i4~?7IhU>bP>Rh z1-}UCRLsL}36T~zoK;*~ztIpdY@D&S;GQ|kUs@gUxwda}`XZ|>%Md;xvCi_(_}8R+ z!Bukwx6>QNNimA>BDvGQT_fWl_+x~ec{;}axVtlDH*QS>`I z?}@}SV+;JDBz_kA!coTiu z+_0r3;j$)!R-YX>Cd-HUo$wp$Fps8tvNQ{n7L-FQU<~UNSqFzdKR=sYT3k082@S2x zr}0q%FCVveO!o9lcG^puF)limhn?#I=^9Whj%dd`=5ZhBHzFvRL9Poq(u+y8QFk&U zxN_o3iEgag8PLq0?p3kN>azTi3^Aj%SA6pM)dxmq9#~E3%n_vF?4ligy*n0Vk@of> zJ_z>Klfteng5aM^52$LFu~T0M@iJCBbL(KnV%e4Jkfek8n$h)<;5RRMeDHk<|E zX90fTTkHu)t@GhZjwI;9>Pmh!?5JSr=s^u~ob)KWEqapPvLPSakl3%9r>#8GzX*W6 zxNP`9P#p{es$1XsM0B*%>+KwkM#nn5-j1=TzbD~vB=9y`kXeyWZ&c}ScOS@<8n%CB|V~c+Kg0>l=_JVO@EK$cKMzz1jLqybHxFgFR>~6mKHeqDFmIHyEb0x4XW@^gGSHE18l(IM ztQ&Udd3XT@^Gy&&Gn%L$WcvH&-3LeK&mX0;y$CO2vDkR_wynE%ZQXWu@Qmfl*Q{B- z{0y4I^zAVA48IB%(@=Gf%IJx`F!hD1FfbulTNrP{hnIp+f-yest~EE84x%0U*h~?y zyI=*9y%+*=&ATdpq6r9LK>m)276a4MIk(;39(T7Jou-j!Va%Bxj()G~%+BfSaHcvV zF1s%^IOOl?8;(-=1o|i1b)o+xWXlm|S1A`K^G}@2KcueIW060?;=o7tKG~6zqbt3* zC%t&Yvq@gVz0xx5MZP0=IEd>Bas6G;7Hh41AM-ncXasZt7)|ZRu;-F> zS=oXrzgtJMo%0v<}G(7}iJhEB1jWt$A9%pSQIIumH8$)HIyQgmLmm zTYYJdC+%--^;7CY)KWCo*%^y=h<<%+KWz0O%-{mnBH&A&31tS)sQ8E!TfJ7G*ve6G z4B|!|N_xGaQ;>)j8`AoqeG2|31ytT_K@BBqU)(TVpYe^FEEdzKd(@6^zYW^QTy$+5 zagE`6v~x6Li*|ZEol%>bUOVO(z-!iyanFR+ZnsXrZ9WtU4>-m=<2HL{{FzX10xxU! zhRD8YZzJuizkCDqzCS>(Sg&H5qB)+bviT}6+X&&60y^>=9Cfggr-XK51&`8tp}l8A z)*<=bn-uQR_jT|g7r_j&LX1fSuc9g%NEs%}ZyulNv-69Z-M)yuYi4TZ{F$j$WAUz) zUWa#a*YKDqutvN5@s1&vlxViK){S(gyW_$3*}ZdC)}DE$KI8Gb(&NRB!Bi+coc9;n zT)H#Q)FlwFN|6-&KGG)V|C*c884`Lv(S4oNJJxRu{m`eaXMjehH>qrrN{WY>hSFWblV>EoZfA%@VPbAPVhme`mIf(&AGl$rLSMKX7UnC| zF;qTVpy8&7KdnG;V;J#PCw+nh2vdZs5Sn=i&b)5XhSq>dZ}uBEWWRpvJ@?#`x%=+BZ@Evp{QJQ% z=%2ywmktMKhraZs(Ci>z4BQ-8hn~Z@b!+dbD{G*JiWUWM44xi*lSpVcS%6F4GTKkj z$Wa<4Uj*{x?V%VCIShg#yaM8iVgcmIs>A}sF_N*a?g0)x2ky_xaMl`NN2;|TDpMX) z(kuCMfki#(c|9@1$Pnj4BZk<(l3Zq<&1)-$7jJ6dw$kr8|MMT4*3L-|dzYp=BV!u} zy!r-91HL8W)emkSk7NUGU-ZJWf_27vd}k)O{elF7CnYvieuaM%`=&ave>g^v3p4OB zS`o+@hebFH>_`=eAf@1sMx-rBJxHCHe`a#w+wAZv;EQsKk42er;Lo@bdPq4?jN2wB zzU7^p4j~xF>+7DC2<2wl9ri*fI^^K**91C7u)D+3?mhZY|I&QdlKzl>?;a^^ z_gLIg>2k?u6FgZy1Ge}-Bc|bG8-frc95w_4j0j)i`(mZ*8>O$FSb^utW%W6%osY|Q zJ?t4zpq)5-2wdKT^l^SRsv6isoECD@5$B=KFGQVhm)}X2S3_jRSHbCiFH>VVoIb`JjzBC{GWQI3(?gHobD>BhC7H?7xoL~rmq z1e)Oe-#+|s8~*WP?8iTj{a9%S+TC~fdbBXjt_i*h@z0gE@%1qHaqN;m1|NA7`m5~9 z6?WGa9>utUf?UTi#Hwo9$lq~?`}R9rx8Lr%Sq575;Ck3GO6Ds*Ev zBG!-54ja>%b_k@0$m^^VIdz@Y{5HBOUr8MBzSC;6wHmF~qWCqo+P*9h_!k>K27veP zZKdzasqHzSgz*Zor-A!Ffr>w8+tJ(4vCENZdjnviZ|+v?Hj4K~pk|I*Te#KFtx*u@ z^((J@9Yor4S88oupI@803y_A`NzZGmHkP0oyc*fv&bw>)cS_r+0sc8&&>8>?653$O z__koDt*rgk;qs>&a&pV7!LHSVPl7^WfQJQH3elhbH2UK?QJD`$d5Hfbd{*_Kv(lTg zJAu_jUTVQi_`0t69&q^C>}OI7yY%^mDd`KPD}H+Al|KdE2|j~A#1CPY6UR8hyD0Y2 zv@MWr3$k)f>lKyQi91OFnc|Vb;%rFR`n}%vRKjMDnLJi4&x=V|K|P+Zr7a;+L2Jwd z@NZ3pe`!yNmf_;>CJt^ZUCYPw96t<@O0HHpdGg0TG;%-SKpKd_?WOQi)d+4_DhtVDau5ov?%*5$}SaU zB1&46eM*|(AHz6M1U5xNQ+u~aD`B_!BFg0GXezr^+Q2W7K7z8>EA<|h+^}mtfwH$M zWj{f@`y%j@f&GEgcP>GP@;%Z3>p{O&GEte!jignQOvER$!mGR1#iYkRE4z+; zYsWLPT~#OSs#NXVzI6#*`!2Nm1lnCawOxgWM7w0K)rE_BQ*2$AG@!KmTeN#_rCkY~ z341N7=@RSuq#shd*P`A1f=)%1H92} z^P@oP%rgZou15doqkr-r(Dy~S*h*3h2CUIK@Td+ZTI^*E=Wj}GO5kC@v}?{BqT?0P z1iJ)d<%aEW>YUNwQj|Ls9D@~G_A+3##}vih0qZ_(@0zI>TGZv4kf*me$(3pdU&7&) zHko`bM^mdw?^CXv&L&@-Pnu{AI3ezgUYC+70;bEPpRtc1tjUe_7#0ZVjXKz>YG8w= zEwa2Skcgm|Tg(#CPpu(5rT2b|-|cE?wduTkhRKQdx83f_mGm!%Ab-puyetW#2=s=R5O{4tl@KCdP({SOi5DtlhR6d9{5ake5at+ckbSgkE|DW|}m`urDmp3bMNFX|U${y%i{ zFJ_|=dmp1&P0Th*F|_EuxZ$qm5OdS4ZoG+uOr*+I&76PRX5% z#dEoMEawWkJ;9*I9aP(Yge}!=`X99)${|X_@3&C0-yE6ha_BDhW_BGtq@OEQYFcJWrpHZBo41;OV1Cm4 zocT5LznM#x4VK$1_gRiu9PTj#h`qk#KZ5W;zx)o_6*)A8_@!{^-uSce=mjNqR2vJntR%9`v>P zF7n;#d(8Kg?|FZ#f53mO|G5ACfD}js76sM@wg>hFE(_co_b0pNqZ{^TkGE zABnvX55yDkT>Pr|V+oeHAn|6~>bA#|bCP!?zngqK`E2sdXFp* zsZzR-UY))neNX!N^lRxqrT?1IXPPsPOemAi%*w3J?9W`0c_8yt)|FkE-I={3`%HT+ z-n7`%eh9}6Vw8E~&u)F;z@m*U19)Rd_d2n`&p-2_JLU9cOLme%9?a=g#@CtN?t+N3PfU!wd6I4{9@ z4eqxqX%1;U%Sw&RD;;DT`CCk{lbDCUg#YE@QKpkztdsvc8<7HR9sfS-LfXY&#%X|k z>-V^B1uwq}9)Gp`B7X|`Kd^PWG+QTGaN0%vb&?bH2l4!;S%CL2k7Q&k_yep_`Wkca z&#-3xE!N0yVs3#C;WX{kwK1!}5%>{~>IwV|IG5qn;jF3PM)*xVdvqfx1Af(~!0%iZ zmGYnua6HwiYehNm7B~~$$_boZIQwwo?KaHvSF3O)yr-U7-C~saPzShIp8|K_kNN{d zW8fZwTnIz#xZqxf9p#Vw~)3HO>IeEjX<> z!y?@VK79%Nvkg*>(yQT1evx%ztdi2JEYGiJCS6v*9pSs+uh<3u#4fbCi)EE`YS|Ll zdUt}y)U=4}7nu)dKhA=ZcOV^Ni_2%wsf)6N^Z}cvGvRDO+b^<^a^|b@Y8j=YI7L11 zDDmqzasCqLXK{WC=PfvI#rZH!eAcym56(~Fd;;fhaU$}md^OH1a9)O!?om_`onKc@ z?7qtni8)L21QK5NZ0Q|r5)YMEm5cf<${HX~ar*r;)A4WfH0a2rL(*!L%$HNX0dp~c z(gwXwhgmA=abduHc@;rsWPEf22`iPQKO(9CJ#k}zaSGUC_}27INCKEEwA|n(P78kN zX?z`-KaF$%_w}%i;Davkqx7G7czycmG@;*MjNp*O%>$1tKpgRtY!SS* zOYnB{GT^h4?PC|Ro$M^Oi=7Ru_Fy#5!Mm9I*?H^$J0H5l1#A-k_rP_CN4tsLz;0xC zWdbT=dOj?9i&uYx^J~`};pHojuyHSa1xdGYLk9Y8IuMvRYy2?ZgbOK+f@BamT{FV&Bz@fmQxmynfW(9U`-g;Oc6)A3PJG7=faF{JyeHMO~uMQrbxyD_|ZdccbLhuNA#hp5eEtHZ&=A3Ai%eF%6c z*GJg*rWJ5DysL64Y~8do11ZuzU+~M}9c2^9RkxfDuIaYB-kzu3w{>u=0K%RtomKRp#WTafJq;y zKY(|b#xV}F*z75iW)UQZCTUiHqN~_y_uZouKY}dV0vxUbMn47IPe5k< z0@Cs4kWVx?~#nlT@&h;FgND&d6o<;FT? zguTuSFOD7(IRuG41FPmkh=KSPdk`}JhwQtMy7xjFxAIy@+iyZLe++y@|0&lH*0v2; z+e~aDqG?{oiggua{MA?m!mO4Xcpa~YZLoni@+SO;7A@=_*%x>#H{uK5-@%%DCA*oM z*cI#%ZidzHJ@zhpA9L*;XrV{IXMR|PZv@|OW_Q7YH3r%KETsOm>^ZCgFK{cj!B^+t zPVVCP(iHdNGdF%7;6d0k!#u*H`b8@iERe>Q>b7s(j`M)w{BzFAmh8p$90VJV06b0m{{G7SGkn zZR#h^-@li-?Ck95mb)I6(|j)1K%gMap1FCSxR=j$C}ka0Wt~b{XH{8VDa%)tbt!H1 zDEE4*?u{sABU)K!Q7-E&R?2cCxtg=G2lk&W&lL{+16yfakTrw;=>K!mV-|3XIAXo9 zs!rl}2M!LYuou4<;o#uFgQ)u)4vMCwJ$VkZMH-*AU^#2vz4^d7;5a=sh#u&^mPf?q z+1vJ?!}aP|}E>vi^5bTxTGnngYC%wX>FTZjjIk9C*d#!R$g{>9lBaQ)@-{g{JZ%mAv< zjS{)^Zj{DBg?#xxQ2Otf#kF`Yf#*`F@h3d@IBFE|T)zB1YP^rqXW3Vg-Y@jSFQcEY zqP6=WN%Ux&?o-K|;wc@Te~8^Ho_G-VMH_(hUevk2{5o)QA}8VZ*Le0d$St~d<0SYw zW=urfeH>3xz01pgVIRgRS*{@(TVAlGA-@otQhvUCTlu&6eE_svgc>GL_y4y)!1BNP zSAM_z5*m#CuQrOtNK3}=udCZFzlCE;N%h_Te!l$m^1tGE1W$~qPnDl0%Aoz%k^6VG z^nad$nS^jChb{Fn0QQTMGf z#Vm+FJTs&GHp+gfKCRwSQ-V!x8)I7OL%olCSfNEf81GX&{n01a{ULb zE};6efbLmHIOPws7=NOaT6jmMOLdRskAu^GTqeH&124WN_`R--b_JE*lk1lMgr^Ub z57R+4=?@wdQR0W?e}dFu<;PSmknf5b#L0h|N*RGgW$r7qV9K-gYF+g9uGY?}a&pb7 zBaNs2O{Nn1eP8Az%89dz-ZB*ggzsSG^D*sU}qp`#2(jmC8{4Mp4NZU^*A?2Q` zdsIiU{1{rKIch9_17&|Mzl`4>pzOu+=kfcV%q_q-M%0`7M|VNHUxAh{f-)~v!TCNQ zL~Cf_4+^Az!TtBayMMs>nizxk%CAs+fI#CDF?U2M&4y>E(-~#5tP;PX-f3w_m{tG% zeQGQGEstJ3*88eIdYUA#_6M4I)hm@ZagF~Wxavx+proP){j|bqm-6a2t?+MNf}8(@ zksv8y!3e$$ooULS43FTQk4?Ejw8vlhn~*0J`7o^pty?s1MCV5A*#*57N@09)mn076 zCPs^9DB14BUlqL@QBbeksZnlI(jm?cz$}kqLgQc2s$9yTl`%GnlC?NxUdco2@Iv3i zCvfE6sX2x2y&^C05hVe-uKp8zsYxEpWz@4^FIoAM2srs-cu`9uE@fRUMsRo8C7wgXj1(* z6*6^Z3w++4Iy0)Df)s&tmH)6xsk+ZophTryy-z7*=>^r-e>)F)lZNcZbH5>o1g+no zwEU~elP1WUNww!nDS6@*daI)*-&5#a8He(T$}`h4)90n=U8{YH^+@3v0jJWKCh5ey zQecoZhPT1ZmHU8JgXwJN*>A>TcjPp1Km%jtDgs7|h_mMAm`V`LJm(N!3{H+vY1dhdX6%PJewf{HnDYFmjVfjB` z`5^iE9yF>y0tWC#`QM?;E|g%g<8_({(+R{M|93xuQaI8fewq)C2A1;2k~rPm_&P z@1gz=%D`{}El@{TsT)weaNfnE47}uk9N@ieh^cRHuOjb^`;#$^d}!Cl%}C)X@>)SJCs9ojUW16H}$L@ z4(wIv4KO+)LT~WGZXHysPfP9a=h$%2cMtFuJFMQ_@aGi7Nma>{MJM^<=+KGh+wrTO zHF$Ckp40qWCkAbHsejyF-)*)bcH4ZQ07_Pynd=iHbzNt?E%jKx2 zcQ?5GUQqh0IPCBj+z(3s35WbX;taM4&z|1LVq?0IwG#p68(X>@aY)OT&JTcwvImBX z6d&vdU8sco*0oAbPxET`Svxkf&eQ(xJ##nf*k;Xc?{50#eFxj1$MzPsCl> aizAoO{W?*z5tNodE%G4I7cTH-(f=fr$5HM8yNf2m3_Mo+|gn<{3Pzbjj`aqeY>~s zV#8DSG4`m6^V?{L`m}8cV_*3Zw$u9#eC&=N|9yQD$A=gbzi{*J+i#HvO}8@k7eB%E zPkr>(o!f&;2j5}r5Bu?qzdEq}j@yj)DSwUaG_H@|vi-nr%evGcWB>34Y+tMF!qxTc>jI3-M;&_-ofwuZydt&gkLa$m2jW$2tQ{clUYbJ8w8Wg66rHjo?ZjVt;HS#6AjI~rU)7sKjF8RJ?HFcS+yPWA* zEKNWD{@T0y`|n=+t=ZoV=W=2E*ww3Si2sUj60WceGvnDZmfz6dp&2i76W$@rV(i!2 z*ZeUai1MglGx{Tf&E&BQHnZCzTFq`nw3&BJ zogt4iq&9_k$l>J9fZyYAb9db6KPm-6y(Z65GsCvC&)O&U0x~^sS1!z6=y@9puD)5h zaN)w6m5UYj=TlN%rRAOKMIN974*X$(|KEJ$gU9Iz{WUl7N`;r(%W~P9(toM;l#E|% zS^t$qjJ)Q{skNyMdy{uRh*4kPlbpu-+ApWR%;%naZsgp^bNHiSZpAskma`>SKhJ+D zDy+=j*B)u9Q zrg-|0Wb#O+v=ncWvV}s^Ln0TCKbGacpXK&!G%G0C*2r;Nb5qO162DjCH%a_R{K2@8 ziSLOE{y3N7?q)XK)KEWNc&H%kEgUHbg%ST90P?i2$2H~>T(L65}|FLXC7o3Q-u?+9V*a(e*N!6a6?`U^29Tx4$GdYSdGrR?{$JxhDF-Y5H( zdis|3X?+^2H^qbTy0{pBvg?mcEy0$$7O~~Yo_cPq_tj_W#rgrG*=Np}Me~!MKQ@MZ zp-e~&J!t|nt7Dky{-wQreZ75JZ|$A!Ute-(anNyR)Br2*D6J2#{MfVu$amdb2p zZl(eRt*(H|JB!7s{M4O9=PlhrxfB(=Aiq?yQD|?;==NUiW=HYwXJSg!m^zk!2{EI!@T*oaDF5CTfK{oKd zc<)j}t1;2$^~HPJypl1o)X>?+mm1oH{GnRD2XqzS_XhaU0N)(ofm*M@z=B6Yp?K1mNc6^gCyfb@ zG0|)6I!-*sxj)XcaULHs8nxq0R%Jnvk2LUx<7}Cy9IWL^Ew2q^`wjdqFF)$#ikBO` z1~C}4?rA>UEHoc8WqEcm(HHNlIl6=|Io1yT_sy%9pH?hGR!n#v#L|e_uF{NOCnlYy z8hNAo_DtoCEtQ#aQT?Bl%7tQOMyDsRt&3Cki(LIqpg7~IUP6>Kr4nKguhJUUi{dO*c_8>p9c90*i3iJnrYR}q5_dJ66yT!&pU0Y-% zT$>BNhsK&pwa zN)}tQz1@~jvJN~Ga*90;Ib~u#&BP`Z#bP#?HnE;pbU`=+;vj~hOTovjrgoE6xKe7q zxwZA?5+oU}UwL&IUm`k~jcwQZ3?Xy9SumOTDf7?F@0-PY&D<=D%)&2Q_|q2tsD%ZRZ7 zx=)M@^{w2xb!Fes2+x1&hn2$C_wK*{y{(1H59z(+tIOEC3-4w28fp!K(ZC-t{M7KS zLHx9V8)S<^P;y=@6-yOox#H|Bc0%kp%UCU!X}W{OGW`XL&NBU9&SOz2S8%up z8KsZqd~*}c3&*#1^B%|+9nE80&gzKnfLQ6~?Tx(1+xKHyU5WbfoKj<~8%!&XO~TjfN9#NpyRcStn8cb^=m*C1vP@=K+E|uT ztu>;_A+8nd8Bg74y+ZTc%3AqVA;B!HSqn)|iSk*_o-&ziR^chbS));Tik%$?7DC+4 zfcj@=bhQ5G3$rCc?K0#ebP$NcRO`3Lzm5O-npa;Pd+jyiv7BYDZfED%?ZEBE^UR2; z@q*PDnRwhLo6UAdk8R8**kmIs0zUeEUj;l%fKa>7Gmi|dK#f1)weg{#%K7bzL+SZs zhrhhP(H5{&pAq7WJNX1SdO-^_NtFae(u7Yj!&&wMdkwp_czTFE2sL*mUx6SCy%l=3 zxoJzqjrR_{_a2{^sNSaoy6vB_qku#5TpaKI&8rtQtJOQijMlh`o5Y4T&u=MUoj zZcu0cY(bB0ThLzV+poR@x_$`sBeJaK6)-%>1rHavK@@ihyZ8R_WmFzj;}-550!Rvfg~On7g{iW0}dKnnr8 z=)}nUhzl=i_1NL2qYheF?=xx5>)f-VP*}02bAGJO zX$2E;5WK?5# zR;wtj6W3#opg%(Hfnv$9*;08GI%g+PA4FPqrkr+Bu5^C1&{wgh>Iz;V;~Qv!j?rQX z_&hS<0qelx|6mRq*gtATQFi-9zx!TUgk|EE{jy&T-DhQ*3IJ=02|#U3*WPUYq**ZE zrxwzH>Nyu1#dztQQy*W}0ysAvQ?MCR9V%N9J1NI8^DF${y!wtlLA3HLW>@xGYjNSz zDkcppSDrSp(b{_4Qa=kT@0`P}Fye@Xt)L^CNx_~C=KHPdSkFukO-wnThYo<1nS8#4 z0rNO>@TC$>fz*HlmXj+5}}>)^=cJ zqq<)e)ca1R9!Z@|i6FmJ{*xJA$sEWC(3mr=H;H^$+z5m5zNtKq<+(l2m3&tq*w)&a z$(Zj~lxQ0}*-H0qZBhu#O%nm{$zW8mfjpvw`(S5S68)T?dX#ykx@z7qiLh`(oD4+^I5{>{Lso6%E?2xLmO_KBPH;%?z2GW5}Ts)fpl!$ds89S6?lu zGq-PndGS^Wh8dtk>I&NeyA0?9LaPcH%%>=qbMC%1TbnknUcG7Vd%P{Wq^s=t(dCAZ zAG@PzZfM0fzQG@ekFDR7C)(=;PW%(zIm^DLsX=0SoE8CEcnAv?VZ}}pn7j#w?0pU~ zCJKsJ$5N?#<6%!c9FE&&!@mSmivzFXEBWurmhD`&aEVBlwrckFFkd2RMQ$wDx*DCccnzj{?+ z%u#M{(dV-VvV{xZWFb~y4?R;L!qE8*#t?V{i4Jh}D_SQQkVphHA#$n7$Q?#*G_s9& z+xukq5g6jd=n2aM7QvFZZyB3_&}y{UPe#LGDMJ9Z5Npbu3``hLO4xoHfRl8g&@%(R zQUrYf9+jC=1vF8$JD?~59F?kMAmb6Lst8r-x_y~xPa2^$Erv`=PZk4#ex>7kt>&@=jb-UxMU@@)btdV483>Gd1>UM}f(sU* z3zcb(S`%Kp>{pD1zOl^QS$;k-zN~B<|Hfk{3#&#mcm4P0A&|)SBwjTOUX_4VKfvwh zA?V*BfR_klCcvnXaMFe?+A9)^CRRT{J8)FP_zVuT+y^AQq9t_1WJ_T#HWwX5y0qx% zjThs+_d1FmN3qvIsM?O*;|?At1l=0vPypiQhWidP?f{`I>%Pya&~2Q_`^+j(+&t)T z#N$%uNgtl|EJ-HchV1-fvow`gFtwOVl@3XS=v6td>%cmj%g?+)(jJVh%H;Bu{EZ$M zmWSP_lI<8!aiUHE)j6-7Cjeb`e9$WNN%Ja!?xC@B_YInYznk;fNay;F-ia2UJ67l4 z5p7@D)G=Q6J0rE8!*dVY;-yTo99IK{o?M~%-)%Jw@pu7ZB-x&+FFjqqtTj^Gu{0WK zZLGC-9LNl`#FDLAG*WIz+Bzm(*@Vv%%X#BX>7Xe%!kZlFnAa1lb@>`HQB!a!(7t?i z4*2q-PEW6Dmh?47v!IBP*rD0Oc;y`AET?Tu2F7=2KgKIs9fWk$l+Yze;yz~hqWFX; z91-~#j4IK&k7g^z1cepz^H*cMqB(JS9y5rEb2dhyj=`+IpaslO@vLG-!O_e~-v+}; zkyb^Tt(hwQk$@u248mP~30xN@4TKL^bG`)rtMe>kOk|fq47FG7@C8F%hArL(5nq+< zUXPFe>Xq+_J-b(wt)aeaRM7U7>7M?02*oZg$7PbK5qOJopHn0 z6+hrO{g68c-`6gArEG0$h(9$q9^yOsxAo8aoc?|8tN+H2>U^%iK6jp(pvD5f6;fw` zn|SsWQfrC7X>G)PlE-sexML`nb4{`UR{{ZXLu_B{j+hvmlr33HyG67Vi$yMojovr} zQ0-2d7SeSEHjTSr6)@-TT9DUL_XFz=tn19iog{a|ykIeSYv61m zeq(?{xiMbxWM5Axxvr^mxWO69G-g74rNN)hrTuM|12)xk=!sLHfg^lkUc1@n78h0r%J3!nB*OM{MC#&Eqw~9W{Jo4X>H}Z11DJ z!c;GJ^u~GxrFUY@Q43>eC)~0yic#nOMHH(2fpG3MR&pU)4f#W`CH&P zq#I?yb;v0)?~?Zke-f{^`?_OIV_os+qIGTMb$*{Klnq)NR)2hW_!AqNTPl+)7L8iW z&W+`be|UJH|ImYLSAXsnE!Hx0*_(HYf-&h`HrStcIjqj;qV=6k>w40vGWTjcl+X}A`u8nMuY#*2Wc??>uwm&kgc=0~ zrwaVa&wy72*pJRL2XMOul%+cCHmlPrD<-qWXfXu*J}(F-Zgue$7OWgHT0BOJWCU)z z+#WAYen8 zF0adLMc}E|(rfI~y$n?mtTTIJ^Ob|@OHO#J^uSYqT(vw;viPEO@gkQ0*>3$X4$)Z` zp|J9N0{*ImoFer+D*8p;dnF6C&Zs)~QqS((;L^VI#&qA(!Q6}So@A;gR+uP!*|=%G7yR# zlh`2Z0S5P!NptJeb@F$?F6KQHZ;+u2g`^?@^RmtxOfGUza<30=xofzZy|xCOlsmo6 z%}pLpQ*)Dd@&3_4qM8fAMHwon)~bT+>_Rd;hN^Y+S+=jQGmb^9+jZH zyYhqO&S95p<+6SI`S33}{wy_6Sc)~)mF7@=JX#mD3Ih0h7xeZu;2&A`Q!Q1eSzSZ> zL>^V3rB8()3=0CS38c-d4o5Oo2VMR$F;Oh{k1=iqT&|M2$og)j06p<3RhOQ7+^1PC#X;@$Y@Lr48T|>kl;CUXt zV|}r8(;fZ!fpXkfV@l@Bq4o{kiAdK(*HXmZ|F6Op9q0f0 z8QnY~q|_RKZ{hLf^q0#132O z3M-KT&5;I|<|uYy@puj{G@OMU{t%rTI_BhD2CsQXvlFuWoHTpRfoyvIt{5*rhZEDs z1Q~ORDb?qcEL>8h;WS&A)(Y_ZT`Xo^BL4>2{Jabw;*CPC8g0HV1NrQBYhlq~x{BsU z2a3Zj31cj>t<*ZPBpF#Wv8aBLjjx;gmceY6n?7>l8k(yaXz%Ycbw?#4~m zZ{JRLslKNI`}ixk-p!7lXCmgp1Jc^7a_1p8(H`Yloc4Nk8wZ;fGws9zb8qH~+2iW9 z*l9{5m|OcXv+mP2OT>gEGL9t$v#iq|aUUW-PR0-MBbpnsMd5x}Fhj|`hNxq!v&_HZ zZQZyu+1Z#hXS_>GLw(zSTw32-YjL_wqmIPzM*hnDw+px8-9zl}v~3|muZ{MjcEP54 z*yyy4|G>(Bpzz0x+!AoJQA^z78d59)OU@!HmP00!*%u6XLk2QJBonJSJG|WM zb-H_0&#a`(shxRgqHw0gNskx~Z7Ejs9-<#XIeeGHx z%Okj$BPW81wYav9kDO<<5O!5ZxjrTc3tZmd(4NHC62g0N{#b zD7_QwCNH11U$G1O?fg9xSCoJvysu!Y-cf{8%HxVKt?>N{hYw7C!1*<&FokIRAr;2= zg=c_!`NxT`JWI-4>`;{OGHtdEMU$t(JbdVDHT(tIprzLxCKK&$^_2R!DnjI5 z&@wnt1&ZQQ^C5(E70cuGJ}nd-@*S(ItBLj1^oDz#y-9N9LyJtxxaK);kgs@3=CrO^ zaq3sGeoXDfc zlFqFXLebSTwgpDkZ(gN256{iqx9PcWoL=5=$M5}KTifsb-W?5d-GM)Cg z`|g#$C<~vE`OPxlB=cdJe_H*5D(p~iR|P>+$5p|jwy1)vDo!ZJ=3b?bRTX3a3;7OP z>GScYqa5%ZYC=sMf$kY8?=&sTyT2p2 zhV&WY&h$J+PsS$cF*#6)ex^R+M2wfU5SVQ6m}4+S&rFeylOm-ub&N8GNNv#}uV7w14T5O|7k)jx6mzy18{ve9^kr*0qb`@kMJ} zTh}d$^UWKlH#atJp5C}H_Us+XW{39n%#Yv?(CM&P0-eszYS?O$Mwic#y8|qMMsgrL zgE4Se2WOBJIWcN-9Ac2c zRjrp&jb`$Qh#n2aJspz(a?GwPq`p=yj{$Y1wfN(Ne9^gq&@7VfWX63SOKcD*r zA?7Uy26pg*IQMIFO}ReX5(Rd0mVjPHKJF$S(>kRr+^<}*adU=0nB-CnN|}qFa`9;w zch#~4fh7@Dq=cj#iY7eKgc6NPVc{@h(U%v3(ifga6oI1Cm$mI+Bex-ctrR|NMJ#pH z8h})Wxkd{dvNjep#XeMMen{d+CB8(0Pu3!F+zlrAR}V?(E3VX`(=#C2%V40lA{C}BX8zQ zI?O4U0X&>>c78CIl(I(y$RyRJDK_+6()N-bqR^8_F(o(Z^wktnVtJ%mzV}eLaZw`E zUy2+%(6cuX^R8*HX-a#2xz>1Ld3*G(qjdvqSxdyfWnf>tkO)|92_%Yc-V;{GY(ZpRcgUZFdDe$#at5EyH?LQQrSv&iPupM45y8kNpAz<|}KijA^ z`V^qKmlh%|1X`$v9IluP{)p4TM}l02Cnn(RHTGJL>83Mcrer!lP3D>I5tyMg(|3_! zO8Uw?W)T#N+tpij$APx1rWJiIVEz3{em0-~e&r>o-q-TL^HTveuTX?I4}`)r z5GLw>q<53jUG};BZLW6VL}s9`H@P|4yL7Pj=C*z9?fY7VXRdqM{&4O`pPJ;ge~8zt zfu4L9U=inAv~)+DzZ2&%;$Iyxen)_}yZHZh@gpW=)$%FMzsNZ9hAwMn(BQ`+{Apch zzO1byphSY6;Gs~&6N)^V>IzJ*iNU6Vbj%U#Qn(V{u%0it#%b-^2KWHoncq`)zA&0<#%ZXRuf4m3s|+;=Gpk z<^@o16_Uu!qx3616(jil%E7?*tC}8;9?Vy00(7@1wgSkXJh*TWigHl>e&D4_bw?g2 z16iy2;|J-=gB%Hcq$-n=NJ&CS;v@Z;)agdf|GIvCetYYx)E;{@9(U$8W!Gjul2hZc zsC{R8Rm=8zV_vnU;6xs&i%hWapKqeJ5GH54_3ZB_s6F``V*b@{J`s- zI_>?#xkrO!&p^Id)uDSlTqM`r3Cx4r>_^6e#jo037UnRy&63;99P^e2#FXyS(^1`{ z8y_x<>yX=w%iMnCNa=2^Av&NdhN?bqO!b4PnFlJR<{$TO^MA_!s9*92k!a}%7K4Ig z9@zu_K6kIHSM7E5TFB&_2mS)MVP~p<-#mcx6bPouhk1bJ^A7Almaq<1GD#A^cS3sr zQ!IyhSp-D+yN>!&TQJzxoOj$@II{HZ+n#v*)*trY(HI>b8%w3e#)hLCp54Zm&CPLP z?%UhHxlxB3>U-d4eg?ep-t)`?{9a98s8|%qa>(lNSdp&my4CuK^{iF20`(;Qs}%`& z%cVmG?lEwFD|+V+Wl?z{Q*U8^5ox$^PVyI#9#?wudEdC8h|9;&)qoF6KV!>9xqpQ4^+Ow)A4p?2E_| ze)}cz=~dwlkn65}@EVwS6j$t)D4jvD`yx^evVkuCpF0XM8C=G7e!n1C^^gAPe^hYD# zfrI3aGdwi+(+sc5+pGTp*j~Q+0GMGwGjlFc-P@F~999=@PT9uIO*C%?{>wS*O=Hz> zSt9ha_fh46jFUeB6p2lkD9*}6gGgKR4(tnL0Ws(Y#aG_S=cyJf_+mcrR`5m4lwZys z{Z#QYqVjP4-MFd1@>hSwF9=@PQ?2X=nk7LtU;{B7@=;J;19-|M&5sp5N+8yekg1#W z=yp3p)C~?e{}5zEg-=| z!$?~+wRpV29u0d8$h1p04md5YwM#|A7bV%~PJ~NY{y!tF!wqxK3$jsiWwk=SJL5u} zo`?L%hqTF~F!BiI<5zzvgfNdTWDHF|6OLoLU{hSu@>mIyB_2FZ8E2yktt+a<##Sg# zq;U46dM4>w>Gn;lNG7VXe99`Kq+Q!8c*ib1M_@}tr-2QZG;k5Z4Z4X4nCZD|dWc3( zb%G62(g8I?5)TI1wa|GrNYRd{1UX9ed=R7jb>~2#V`6cvwtw5=-d*vEy_{LTNlka= zGMbbB!V<_0?ONQkdobfN2|rV3hYj-1&AGvHBxDB-maqPje;YWKV9%Xr{;I`JqKYhb z%&|UFykFBZGRU!OgSv7-Q?0(CNUA3_mJ(8$!#AX(n-v#%j!QaPK})-=rSN^UiNvKR zl6EKQs!qz`b57f;F|F|$-RD8T#rePj$XJ(Q(qUR<;331KL1Krqom_7vBkvaoh%yYt3$BA=f>>eMp1&a}E|d8TZy z#CP>B-qv3mTRhQG7;y53?V(6{Ft>T9Y!Dt(XJwNsGq}5F@vfnqUI#}fJ?f(wxgjfe~Aa3Upd$CW2)$7*k_ z6;e1tWRp66Jz8`et}+Cn2{XuLg7LCuC&NaE9(y9~LYxYZ!E+tczSI;z1_tc*uoV`I zaXF@iirZL zwuj8i+BO6W?E(^J`_>os-^S;@WL!PbywquPu50Vxsm1ti-rE^(PP&ocF|fBk`Fkgf zZe`V4C(05%bwfLE=~)%bwS-9~j$?5zaLwS>Wqx?vY8XT4@S_>0FeVw}@nw_6xOp!jfI;Q|n!1xXcB*N5r z+PI7WHr^~+_z+DL1AaIm^jXAs`5Y#Zwlyov)7s;TKFvfnI+bAM9nFi0Qz+!54B-*V z6ODoJv|o3sCiI~3>R1v?cf1fMo?57%hMhvp6(v)O$dKS%O;94SRFy^~fvSPui#nH` zy@*NH_rV+gK|*orRT2wvDI{LZ*QV0c^9QU0jm0(H>16MgMZMb-$9|`IBJQkN)v#um z+l#s7tNht=xVGEXq6DKoTY5XU4rJZRT+jUQC&T{|7RJIaASod*$qoJJ0N>$RMqSn2zQF+*m}72ukEk&^qZB&1Y)#2oPKhL+ahW zHAF+8p4C-PbM+-ImgnChpO=vca4i%G6mZ}0PLefavzkMern<`JhWVF!-YBgQ4U0PY z)j46;c2R%J>YG;Q^gl4CA$C>sdKH)uCMqj2DgjUnF+`oY2S5cD6%=4rurR4OsF2s0 zeCFqZI2}CoX-|N!&{v>@8R7B0bS}(C$px&1JzkD15@L*T>|=2sPGu_XC8?r?aVszL zu}RhIQN2v{skns?8O3~*gcoUl7%yl^n>r-bsMbmQnXqqIRY|(3s?j^_SZM=B8Al|2 z(lBqtFbS1rFX&# zDwRN2N6B@--`2H=NB#X{t5T`qr5)~nC!EU!x)!&4gNv6e0iCS8`mU~PTi6oK&Eq5n zR0Y;0NA4V3VbgiPs#u3CpOPlUGgfJ(Wtu^i(8HUvp|?qMVDw6;_-nI5&X0^6#53M+bu3FGUOXiS=) z&cLvu*ZyGq!TbSTbBAO@s2zx4B4yG&cok;Vd-vKN79Wd&**25{dut0^GcNGj8c09{q>b^(@K}^PqFjmQCktm98%AOy&XIg36IO9`I52I2`GlvT zCK>nzm|b~>2*^^^Mv?f6WGw^;s-By7XMVH=8HTf+KZ4s9p@Zu)JI^=uL040KaKY$# zo(r4=1vK2dumKtAOpV9)50v`-aws=L}Q85Mc$>I`=qEyVme8L`&1Pm4azTygp zB$v~c(l)dZvuW&W@CMDH?&QLTAR74Gye&y`^Ou+>Kk-f@X$SZ$J1Lwtnko8FiUHmL z-gmSZc9NKM;)zg@Ys)D}2J3rtx1r{yn<{$dPn+86} zIQ8$jk!@akdD5r;O$bAuqTU0)d!EIrvK0jfKhVN>_h1eSFD;NIMG7{1A~BiZly0Ug z*rDTQT^i7mtuQ|k_mdsyCwAbUc8o(^*MpceQU+RNS|Vbo#t(Jvv8wAVOlmb1>UtuW zd_#u;A)M}|Fkx?cVcb5}-#x^J~~u%Y+c-hji&r zXd7%4tg+I}2m!pT(1bOnk}4A*E`~`#J_cMwSkQMkbXMeeB4zYX2G1mo;&do79#}5x zl3q4X`}GyS2On0I_GE$L+Ymj}r9HlOUNOFw)kU$x_W7(Yu%xQ^JablcA>swZVKM4@ zv2IQI@x8&IGU?Z6j+Q7ZJd+}YPPZ3O(ybqXR;wH5x_0X!Na&|Jo=7VCCo5nJm$eM; zCQXO*J)y{|z;ct7U}+`LS#=xL3XMs(%|WP80`y#*>)}9M87RT6L1gUK3qN2r=-Q5~ z$BvOToNBGAMqijWEbYbm<(szaCg;vXW!?hiVs3y8OFm>U?$}H=r(2mFdtEm{2@k6B z@D9Mp$x!QKl-wk1To5is)3gI+29U@IxKWxAC89tt<8TO6LpsRCqiN!*H5LsTRZBS+ zDl3)54#6!-lCa8Pu?Ta^`M+Ad`g3xy-5vx@6?hlrs{DYm;cFM7q}C=1bCH9?MA(-n z7&?G(nE-i4Y6)y`vFKEzyIKHC+SZGJ6AF@mV4vx8s*muo5S!O+L7HUvSBS3@OAla; zSdP|*yBmotjk@k$O$pVJ8d1Bb5=~4>ibqlsh^~di$wv@HOFvQUDe};yrM@vrY6Egz zt~?8dB}MJ@zUQzD;}y+=*U7W#`s^x?f7)#)y0Pm#91IIYFke#&N7I`W@VQv|jiB0p z%FCLF`xWCUk8gu6Jjllu2kxf6>|A)*Wrn1@>$}l}H^Hw~e*%*VQUc)4Tp0d17AFJ|~O;yyRLdcTYOJF=Wel&-h>PbMvHf#^)I} z4ZBHa&>U2@YKMr?>xxD4bLbYmj`!Cj45h}++auQ^bL~iu`#I$2;?*TzW$`jcyv8q8 z9EvNYO|@I7fHsf?=Y7xkeu`D3YWgEGgLQ-SIS``QF#kT1ZBSJ4jU70pwJd&WSm1r6pc^2 zy~xZU4nVU?E1DT_)zZ8r&9QmmT&8{qBN#)xcIfsr*V5zZZD~>8<#79l((!P7GLiNq z(it$63+L>d7|aFofh58Z38-1qv!E|)BR10R%~+`PP)3z+jM7au<8$M={Ln1p|HSy; zGX6Z{55tqd_??VzWw$b6g!cU<`#UE3RJd~q3}|D3l^kyF3*g53E~Isi`rwcYXXPKK`KZIiGOY$9MVoY9Al; z@%MfFSs!P-XkCRE+k?G#p$wtRyz6i;88el2M z0mnOKJ|0@)CT!alC$;ms`C2eJ_97d(kUA;N^S0e7%>C===WC`*+@d@`~rFiID1@ z6pbFy*dvaKTg4Z|*F+dGC&hn3ghNwbSA}irWmM85E-{}@UYj0C49ACk!(lb8@?Gl3 zR3R_&FNyp!BEMPuq$sE&3^>cMd02)4SGBrz1CD~T2&3w;S@0bM$PZS7v)3cAXk|lx zx8JT4Vs$|~@(Vkz#cr`Lzi`?IgSd45hi-uz&EFYE7Vd>mZ$2M*X+AW0{eD&PRAmLY z@F3N~+!*$)*2IuK2|mH!ujvVex@%T7ZpiL3*Tj+zXCfLlkD5Z!gwv6T*O<3uH#82N z-?i)f&|a>bD&BI-o=kE7&3g-ly*KYKX7=22OYzj)6tNMbuY*-%z2ptkJQU|NBRDv@5aLB(fetj$f$P!T$!c`hAG{vQ9dQr4 zhSg!muw}%2eWvCk=Pxb9;Q)#cg>m&LE=*Y?W9{H>Fm~U zj$47vj{I^gtTu<)p~yy)F`faX#vcxhCflNnmTY5v;lW*y*vjqHZ!*Mj+*V%M-Eb2UXIEl=bFfne5Vy^-O`63N=OzWYWnrgYijh-nL;lIT zbEk5`j@<1zA!nr26BT=tb-8KAJRVDUI%0$OfWpjr4LbUf;kELW63P%~^QBh-O5}67 zVP7rbupSn1ZxY^TYNWw2_~3?y#~g>?X3PbWev7MNxXsYnoQlU&&7Fp};Rd8qBm;cR z8BV#LuG8}V;kvGe`-VK8p}vQ^>V|y{THVvGR2X&2_!h*$*>m_7h?D2|lOk2#A_892 z%Xi`5qyyERy<( zbX_y1o|RCJ#TV+^qYZmBiU`b{qRFqR`C4(twhB z*5nL2>zty~nPdsyS&LJxIV)i{e>4McI9%Zr;;zh4mlS;(AtZoer00`42=`63uZ&J2 zFrXQI@KWlYm|+NWNW#88B+TLF2`dit(a`i=h)X8`9qD|*yw8XWopO(LXMrr2h&+GEth>n>E z6NqaWHMYbjmnuCN^`u0&zu*J|FsK}ZN^p^%_#;50gg<01;;({EDsQ62jD9*4beI!B zdvYXPOG1><2+ZiAa%Zemxr!b!%4C5B=-IQFql@U>{^^?*;Bl@kfBaMKO{+Oy&42Lmk6TRRCW|lEnHsW%>}bt3v~f_ijF~)>2Zt;H zn>}Q!_S8sRJr2E``hm4n`+tNLZAD5XIx83# z@->)XK#}uXub|r#GB%K?Q9;seH4Q?}err0reS22qCmS|wXdpU|q9^CC`TMwE{%M0C zad=TskzscYp;p=;A>%?sC4Kpo5)wd=;Phht`=uAbhurPx`y@xd)O+i#y}ahF)Sv!o z3S`}N^?mVM$SrmuwsosEl*%45n**6-T~UUp7uexD0uKdF2gE(-64_|Z9j#9v&1B;B zeU{|Wc&}m)*f-es*$wt%kpUUvZ9>{B85HT58>yAR6jX&!yAt@v7s|C!27++hOSFgH zXx_Ur?_WWV<+YkipMRm)52Ky`QD)hm9)H4OHTfERJ$sgAxNFrtyF0sf-?Pf!5#&>I zf5F{zGkkn*Tdck$TFMwU=8d9aWXEl0hX$ii{;ZJ~jXlO&(cl2Mq9Y4h z>&%p>jRhIec{dOlIb*k~d%wvMjv9sunY-4qr-zeMIakCwUXVKPU zyVWMzWDQDq6(2!wZ_JcQnz;W9WE6f*ci&y`7d8?$>b)uOeefGlFXMeWKJFuYBs}GF zd^et(Vf*#{`xo$({XK8tm*9JKKZ_hzuLoWz^k}9AWUoNF>JGx|zEIxcN))5fV#2jB z^6jC;8>%=g$`3`Hz5pHqn7!*vq#GKStH;I<0-bd{n+$7Eyi>V@2vQYj;FhB=V@`Da!@4 zA!zaRdj!wf&5(m&gGR4TLL5 zGW_>U5^f;ew_nM>1rkQjjV%82?$1>181;7PCjSeMkILej!~e zx*uE27q5-(iVB0!eU9fQYx&09{+v*otIb*VxA2zZM}kx6PWeRl`o=wtLgR70`s;}$ zi|>j=jPAYYM>XC)oZpxi^3&>gI*}M`UXLEG)5cY`BKp8k>z?@}z1X?&fY zXu#EZkNiCg=>|Z|Wze5q0Z*9kGmakPljt>W^7+wcd|W}!+lTs$w?mIX0%e4!#2fku zZun52aiQ8~{CVMbuC?O;9M_}g^(Ex{rIGKqRE|s|@!b(j9l^dPQxmloHDn}-T(x>`P%A7t-OuW1@;3i4F*`u;}KXYUm~qbBQ? zO}V8_A-lXnaR~Q*)>K$Z1-SS&^so|S=rKw5`xL>^dravWb!*83pu$S>kg22>w_7N* zD|>l3q;T$3(z2L5gnTFp|Cyal4y3tqM=BgS=2zKK!ER>)D(VzLFopJ_4fuepr#y=?7y2T#oIu`Ym7vM&0f&a#4a_53p&Kndpnfd$1CjOA74N&> z{szE+8cC;>v+cjp19M}|aMwt2 z(W1uXT_bjf!#>irys0zN<{#-AuHo&}IWdrryB9{jc}W3hL?Srb*BXnr_(r-$YV5db zxX@kGm~c81jWv-1jRnFJSS>;tG!SLaXt%I{8V~|C(Q5I7+vjonWS<{+AC2GYe#Cv& zExLozLkyJ=ibFvqgn~*4Fjy4KDtbi;np#{-lCBm%#Kh21p(bh!9Q7%R&*zTn>ETol z@xgRy!Woj_y21PgOt%u?d4newO4MxW4N9Iy_Pt&n5uolq$k9OiS^f9HL~6n=`pta# z%U_;u+n(Q>UR!8bRlB=kd)wXEbTc-u~4RZ!hsuJ1U#j^zV=!@`TBZ3-NQf8!w>ZE2S@lR3;%@W9*eNw!Z)Fl^hi&=;Q>@A2iKfh#20lS z3P52?vOUU`>wUdpY5>1=4T}sDB)Go~(eefw>0{c6!%+({`0y^4u#ezF^-$OT^fH#J zAA=Nlir|0=>iwv%nJ3q~?8B_n>4HeYt^3!iAs&vZ3Q98Vj}CQobhc^f-sT!7nmYy~ z+c%UqguH=)mTadrl&hfwY9Qu_q;J}>bRu+Cw#kvSzpf)8nIx>_TDZ-XNT;$sYfY{r z7b?_-O`ewIz$%Y2YVsr!uAtXt(hmh2(h-xlqjveI*T(-rkVJPm8cKz|7C{u;rC2Bx zLIi?%PD)Mt26%?rVuUjOPW!|5M+f-8Q=SW+*FEAX58nqD z;gJncJOwewxD|Ckg20x)(EVEXkGsXMb@T2cCxK5dL|=>kI4V96<$Iy59GNihH4F3q zaDZYSdAWmkEV{G(wi4eC{ChO`RPaJjyc>llckXrYA;$)X5QKCX=mm7CX1RhpYCQ|lJSz5^@k>sKD=n;$<@(=u9WUeQ{k zSS;dV*}bg4d(0^>7A+pda&YIZ+TK!OLLrfS7^9dJsySTx{#iwd7)V^LT z)_#7%v)3bJJZ+vq^iM78nKWMHKowuGzGnR~DpS5N9N8Gz9})GG=QJ$nNU1UZu%nhG z)uf;#A6DhK{JMNe#=p$sU=Ih14(f;Y26b|&%zF(0XlnL7S)?+sLu9clgB z{QJ6SMIG{(J?2FGHL%Nv zFZlVOpD*$A|I6E(2gp@biU04u>aKm?*RHCr>gv5ay{}0sNq47{K=#f`AR#0q$_#-3 zLPU~5fe;mf`o-Wl$}ox=Q96ktIxff{GdRNF?l=mlpeVZ_DsG-gEA`=kDiPW6@X%yWqS2Eu%6Ysr5S;*u}ypgEsJ+aw;8vq`MX62-o?4 zD_ux~nYvTdo$8L2deZ5hQf&6QsI{)HRc`ZLx!z(ZRP4>oJ`2sw1#aPi$&Ma6|K=ss zUp_2j4tr|lGyuoFG!J|SY7f_%`T!)1$ksZT1F5yJYvNw-d2&jCvn*V?cLjsi_i|Xk z1!(ziZF%EiIrsn@Qlvjd`o**;lH;f0Bwf)n4-e3mEN2c75PO#Y@W>-89(m;C|DM^$ zRHsJNAaz{cxS%`|$`x`wIZNpH#l|}fa~)Y{IPAwcSSRh^uTYWoaPH86F%#a24q;q7<;f@PTNF}G|r4L%Mhw+ z3guejfxP7_CpjAVx#ee=DJ8zV`Idd_sq}tv=oAwu6Q!;@OWyv zf&~s66FJMN9@P&m?Z(CBWTdESipoBazBp}W{l~8&|LYx&7Rzx~_Pkuq+I^GtozYk; zmI7Kjvd$BBd$QFy(b9M<8afe6LJkeI*QiFN<3A*QEp1!8Rf;ht#b1!IUt|WgE_(Zv zEpd^Qs^LpYp>AV&^$s4^%pC4(3S#Cql<;N~{)SAdBarYfs$Vj9pwJv_n%|Z!2Yt~l zby+?ci2H0qweE;75eeA`T(OakuB@x4kZjEdy^c|)+%&EG%`r7X*{~RcWiO@;^<Q;2$P$kQ7l|4$4exl(BGT|E24!Z7fFIGL^ok9)0&Cf3>s9?jv5CvN z{L*XN*IvD}Woz?tZ;N@UQh)lX`i5)Q&Vki~X`Ay;AGH)r_83y94H~~PzOHtgG3mV- zFKd2}R~8v3nN!Ia-Q|RlvfLF&{e8scs*6Ojb%y(H-`)1)Zu{G$2LmUBDV@?KCrMHs zX_$*8lbO|1Js2=3bt;*{_Nsr*B%Sf5OtRJEa;E}CjyABk-7ZVn8f@_9bFO66Yp)%u zvBq3JyTzGGMrau5^mMBc<3;mp?8EOMJ^Lw=HOH-1x9gBiy_01V&J#xMG0Pr?sGp#t zQ9WScg~z0+$Am@obOmMWE-g)UO+<&n=3jZ5lP9lJC2!OUZ(G^2|G}BFu{M?G{h8jq zJ$ZN1MERa-34bPRTEo#Wr|TrJcvscKv5)w6p>Z!J30h5wnx({OJ^TMb(S9&BXJKRG z!a1qg=hA_m?!keco&nR^%C4wJHT)_W@5R5-_@R2ce*a_Ba`Inh-jAI1UIuz>#(QSo=k)jA;`O0S~%(Lh_^PZ zthF4x#(J~$4qiAM2}iTT;$WWw%9JKNNB*&HjfIhnM52dKr?PE=j$ce_quI?!NO}!3 zOBgOd$ZF0!?&G?FuBw6E{>gSs*0q)rVqiDll#ewOXHE!=mAb^hZn|wCmGA9r>Fkv* zTsVY*-KM4%_0Z|zJa}ZMBD>Y{3A4nAp4g0D#LVeOjnJ1_K=7NgBb~GcR+_HVj49~1 z2!Eq-3*oUbZPuj{I&iWY_*B@xJB53PaqCQ2qwXxkr^3GTRM<_8Hrdh96)y8D+$8?1SuWJn)YVm&&E@M0#Y{1U(u}2JnPO&dIu^!}7L(D;MjDN! zhN4Xs)n3yUW(|v3ESl-Qa^If5JNqoYJ~d-HuvgXq-^YOIdRjEH$gG`NXaZVMlbYX|?(yHMX=bWnNR0OkCsSh%x@` zQN^}?A8XOQ)@!h2MqMZSz?tcrnf#UUG$sTdo|)-`x3fkU{5OfA-_yo?Y0_5z`k3R> ze9G5KE6B3@0Rb||*3O|_^(OHa$97E7>2 zSz44GL$=N45CgHD`#KMGT0YXD_O`sc<%2Dj3tQB9%T$Z0k2|;yX=|A`O#i62ZFm@q zj=uWB!e~<27_7f)SM8Bnb3FqMpIOi~IInqW{igc2)ng4Q8_TZGUYxDTUc0ogsqnUf zrC{tTU0pg-vaBzu(!{ubiW9ypetRSy*$~+ksfk>BlkdYmbKE!O+d;qTpi^D!R2!(k zuop!2Ak*>;cH!jkFLC|o=TFdVIVs*^sEI8q=)y<8^O$HtZB$P>NxEi{+68+VJS_}x2%qpS~~Bd#f|?LbGP2NueQ{he^z1FcwF{@&F@rmxJ9Q{aqlqxY8Lma>^A-jxJ6f1!|&7KlgCV!48O|e)=c`7)*2nSb~gQlHdwA9 z>92;}QTf-Iu!iF-#Fa|rMZ)GRlJ;uYeL5_9p2jb0%o!izkOHh-R1;33(G?+V5`UC- zX4q&j-cdfcIleo7P23V^QH@y0zv{z=T4(GuOdl!!Orz1br*XQ`QpnZG+|8#;uIx3= zJnQ%4tX8?!vz{$jGk2$inp& zsWZEDK3&S0zq-y;Mj`A7u2jzYS-w|oD(XC<)uikB$E$g2QVTg+n+?ZGv!>;Ao{HV< z$Il3Vqw!Bw+-9PsNe6Cz6K=`VD()S|BQs%*_OlR^`&GP>=4#kWjc?C}9jM~%e-mEG z|7zHM8gI3pZy6;KmYUubW=#_x%+&L;H)Wf8nlmO{#?9pouC0z~hj}~a(K%G@9V`;E zJmOUMIUjbKx1*aLu2EmEd8Ed~&=Qtv+#c(+UENNX-0n27ki^;2Hg%uvVVik7ZSR_g zmHM)JM45N6K*K4s-CHiZ9AySz&5Lx1FV{yJR{g8qvhWCREV0TQ71LL;kVW0|fe#GM z{%@Og;6oc_xbib>8UB=7u4r_cmy}E69XmSA{`Q^i=FM&D>N>S6qlPl7DWjIg)kQH` zlD!jiwJcngO(mQ)EanW#YjICFZ*-b(bEr$~%97*vH4LMfo7&Z;Hnp=^O*N^>f@1J` zT}F*()VtGaZBk*~_4c^h5mj%CsEuLu5vSsNj#6ok55-N{|NjLnLx{r#>x~nrgOCo!HC$2h+uKx+;&;dU2Se*20?r~+MSN5J_t{? zPoCqb4cb|f{!}?hs3?=eMvLseX_0+AEwVbkOvij8XnXZ?+lvH)H z4xA^aC=on$RnB1E6Ze0UsZFFvy-dUZY@IFp$5V+#R!O(nHw=1S!z^K zZEEywt4HRQ8{5U&Xx|0R*s^Wv*x9D$53CSVqtA%l(P;SOgMC$_ql4#mtZCoBTI`Od zQp-A4wjWsgR}<>*S}{I)@*c53+PA)Na!0e&CE8A&);n?%p!7%np{l1acT{$y5;dqb z>r5Bpt-{O7&#DegB;z`;bOY!FoWd=7s)~CDA!qbu<}Adg!iw&xhTW&bR_mT*8;DJ7 zafPzRPw5`Mp`B{3)M=N~ux!SS#@lA_Cqsc6_e$n1s%fE~65TzQHm#QteC({oWV-`P z3#537!Ij8WR_3k!sl6F1f4Qtbbgj#{Ch6iYT}NMlK?&VzmC=aVu{m4_kqnr$w$ibl zvGUoXY<&?Ht>mh9R~bKCYeaJvX*?2x_VH(V~!dM zs~h~v8jJ=p(G$GBU|ip0zy8zgwM`D~A30J`M|#wO9_7OtRnN#sPr0<4gCvtPY+SPw`zuAA#y5Q~woY%5qcxmdxIh8w@jOdA17WA-? zgw`b0GE&WM*x4Z@k#YYUk1<6iygF4PPTL671M##VtJ9@&Uipl%Nwz@CV0(4zoIaLO zh643A=&CJV^?Pq5;fm#a@r*CkSqN?08EGk|tbS`E-x%(m(=o)!g3h*tGZJ+5_AZ*c zCEdTWw|{w8%-oe|%%|One8Ly?du^V&#=eH-Ypo8aWtD}!FKrEt-AP|6T^DZZXCNt& z^tN@Kv*?YVm@VC_hja1P5s_tWSIQ!1JxS}!YAjl9RD13JRdx&w)P+`>zCkT)ZxQy! zakhHVV{aYo*8vA4;Hhxx6wV#Xs^J17XCRynXFho<+@ z+B-0~l!z_9g)2;-RQFPQ&*HVXPKEyg;oV=dn1T6%R{~j#w#sYRFORTJ;2dL0Im(}3 zw_0uQRcm|IJ6hEz8P7Byv2i#eRn z(qJ(gEgzox)Reh%N=;2LReODG;r!UAma3)K=RNOezp34{q}o*~_Rg5enE`1q`8=vU z=JCYZE$i3KS+AyU@O7!Ku2}HkLJp=IAGfbO*!YeXwTm)G|Ey(YE^{znTseRApvAsw zuwoA4CIKkavQ}W$79*ZB2DYV} zq(gH03JcZf7tKyS(oZ^L_EFXgyw$=rG2BIGzPc=&>5x;4*LDm|<(&DBq5AF>gELmS zl4n@uS~G`v|NN$|H!Wv-Tkoi!gV$Xx+P2pM^&`wyToMsFQe>zT5@p3S$&2u(w$7~k>`3E=7PW-gf`g^P%D(m8N`&B` z;daCw{z-?&A65McY1TLri9~Z^cjB5vtv#VL5o_n&bYi<7ZDq`WSw6B8NNp{)aZxzf zEJPE1>(MO_aae~Ks@PKd7ka1zvpw5CU)p9-^IU)4Gxgeg&h1UUwK=R*eWN?^=e^Q; zpRIjjbN`_Qvz7VOS1<-ZzE^hp)xjti^d?9Ek#(r_2Oqr+)EQ4P0`a9U5;8;3w>sp+DXFGy$fgq#%o zPdcsNtETnaI<2~eV5_CRQf9Sx3T|p*04T_$r4yb#k^fmueYHSX$D;ZUs zJN~H}j$Y|$goOJw;o>^2)o}X=S8Wwo;{-HKdZgy59;qqoT}{@}8TH11@vHLf_vFIps82?0 zj3Z*?`zcw(j)#^PDpaXgFP|v~v_1=Y2RZDmcB-}9o*nka9aZ^G)aP`-{8>0fwyHRH zFij!#uhDP@!dZMejn#0MUNRG|vx=|dOnh1ftKs&6PnQ>?zL$tC-nJE{H#bvWs5ASp zpinWJ^*XDRvAtaWcjVBr^_U$!-ZR!^S{hw_;!ak+Cx+S@dIg=)8!idX0l*q~t zGhtmSO*E}zPu@Yd%j4Y5FoaziuoSe1WlIv}?W`ZvD7slIroOBFK5621&vg6XJB5)p zf3?HMPbwSWsq2hZE=6;8h*XN>?7)7MK3{D(7LulIZEvGRuZVamofX?KD~7xJ`m4^y z@l03W$#+G5Q0y9Cp_-!KukYdcwZfJmu^7`_Zki~ZKO{zDqTzB=WkI_NrZ3(&uk+-K zDcOgMY-{@px?F9jmMi?JU$o9n#BAtnhxDa%JMhh6Z`@QZtBH722aL^>gK9V_S5=%l zwpPO#sWTAH#;wasHQYYJRdsf}1%#%feuZ*GXUYrV_1;;XRw_1hz>SNlcsmODT!@5L z6@b_o#U2j2-OpI#uJZUD1@#eA-E62$hFU_mY5%7K>W+Zg5Kzs5p}-Qh>wUH{V^8c) z9WB`{2kY`HGs~09-s|{VG_d>NdlP@l=7y-21zAQa<{_m$p{P#_!gQ2%*?VC;DY)K9!hb~w|BYE?7ZSn2vXIa6q9P^+2PlpRb zII}#^Jgf3xA2yma&%zA@Fu`%7f+e<*_Pna>w~T+HyY(ocG9>roRnwsPUpR0 z%+&jx(@sluM*15*^(j4-h5;SUJMevKI;OHQ<%@O3_QyURtFg!a>Rt-nr#J=yQ)%AG z+P5?8vW0V;*eQP*y~N8-X)r8D^8Y_96)McmZp}WsXXmucPtML|%|2)6uT%wV+G>EF zw8dyFM_7TUKCe&9W$&D2fw_=Vo2n-6G1L45y>-58jzblc8aR2)dR7B+%opDZZ!rI; zmarDa#oDRSa>;%CfK}C6BkcamM~@#i?qnv{U~n=i=UwGeCmhEDCoGpS&-EI!TI{Jt zhGYSwtmrsn+sDA0mW5_kPE4$n`Qy5-p| zX^XSwXa#faUUF`t+!XR!kJqX_mctg)61kU?Bkr|-gB9=LphKNtak!=S*vH8>FN+x- z-SWm`a)wE_tYc^07(foSmj$ePsGLf_k7X5lm66JHcaMG3+txdrsmYdOSD9b?-N=?L z9f|VTg2bBKsuCQ|!J`RylrdUqaottkHjq+%ZO6ZqQg_Q1)Y9=w4drJR*ffTkyN}=R zQlDYDmbdQs3i}15Z}9HE`&gg&Wi~Z@is0{YeaL0L-StkF+3Ol}t#w&ku2A8G#gFZH z%N#l5^;qW#&fWau2|Rc{`vv?$aGY_v*SML}g6Tc_Pl$Wr2Xx}}!tYrp1)5FO)n1$Q z#HtHiW+q#et-8-p#vnL`VRnxZ9XT~|&ScAAy|);Tr9#E-Y_T`*%fyPwC&;Qub780_ z9KW@$p`os&Gn`PL=$;?RH3rjNzCdR(+Ef<|*EIyw?fyVV!5+i_ML3;x`|9uZaMXFY z=JISidZ65aXEt%by$80$ z_OFy<15_fhJbN&_>VF^{Gl__vSk6zfcKKod>q))4fL`lgq#WU!v7`8Aq92&CtN7;> zzj(H#MXBd!XoTh`PRYW8*yumXQtMxM|z!u}EFonE2*%KFe&_6u(?_8R+* zMA_H8Wt5ErbJp*3)cVF{N$z}lDu1r7YiE~rQfkiHmdBnqN|Ek_ixq>IjBU$?A_hu& z^m+z8>L(*19Mz{c_K6Kd88#Ux$iPZTuM5;8fZ?e5%HW0XIcM2>E*u)V@IA}UdC!G| zZ+tA2PKUyoj5?h4M^l+lIDPWre5O>_;dEgg#Mx0-%H+H9>0G+26f-9*`IOCB>yCxo z%AfLex$=?DgfHb+?oiBK>$K5Pn=o0%lMZA)>(3^m!McpvwCp|GhK9Bg-3=EG4qkXe zDiaQ;QsHps;rDT6{BDphpV-lYvKA~u+6xtc8sg54+4AvxSRicIs0UH&KiH(No zi0zJOCM=E+GOr-x~A#oCQFn4fPEQ7`CxzX)}mP? zd^z9RIq6{;koiVYeWZA_XzngvQ@ojtZ8|)LqWbTz94I^Z#@4U;`?}?q+Y_3MbvJeo zbX&Sx?>}jjgY8|DU9E}}*;Q+x)qI7)p;O^n8(RljEv=1&J3%m>N_L1Mof-k9Jw{}@kk|NIX|Ml7I`7^M#QpNjLE80L>-NMC1PF^QLi((Q9CGi*Dwq83 zl*$ncBO|}Ht6QZaud}Nc?CPC%P6JU#?LVdFv=7=%mt8W^BoBM&^KjsaId>(8o*a(7 z9IN?7?3I{#Jf_yfR5&&kGrt&9SH?^E0R_V$@;`_!U7^}qU5Up2pileWHCUt^!8kLAZSRO6Y+ zFV=sn{)hFJyD_)Y^Yb>XpX*=KzO}1f| zf3humziE7_oAh;cm3ncXm@_ijJ0qk#50u*rt&`XGzOUDOd#^gLS8;Mv?*U(EvR7oU zH&tjYjId1SfpBuN(A>JP{r-~&P81s_c|LHWuE4WmoJeNmSw0a+$P;$3z~0ubob7eO zj-y0gS1c{aCCZ7FiLHqPi8~Y4SV9@>LU|zZRKh%#P*q=xN(7j^SdggsMMB+`cranU zJE1O5sOMRW_>{#WWXf*LPUe zFRW^jRee(Xx~;oocf?G4O!dUF{!agV|9*ds-LFRP^}pmdKjv2}{I~i!8I~iE)YfvP zWyv}I^Zb|i@9{tHuXXv=zxpvy{T08N@HhK+`z?HkZDvc>VlMazHYhk=#C*e|UbLul zEazFwf3&Eh7Ui%cET+#QOFSY@U%WHEB7Q;q()g|Md*il|Z^ZvC{!-lXd92uIKZ`eB z7w?E$-XH&5{L%Oe@tSkum&C7)TU_zhxcMLP=i=s}_|f>cy?0-p?gG4QSOaG)j@XbhNE2HXRBfANB+%$H5`Qzi>z z)B;m+hRHv$QbxbR-oPG{>t5D3IO%RYdU^K+TQ0cl0}8s!W5TD$py`7rsp&lu-@Pr9$(+1b^`86=H$7Pae=B~USA8e{mHYFVDtNnUIr*cLUl3?s zlgYfXid@E2*M@%(xhq;9{bQ^twl8kP zf1S8K@ocg?xjK18@^?>5$% zml(t5BRogA6Wn+5`7vfFjwMdGuBxyHWryb;pyc4)|scg3mbW}&+wbm#wzo$ z;k5j{kv89ft(J9$)trm%nI*?X3O!Z@)ncrPWLl5cNuTQ(bQ zIxopb$;;WBe6(?ol9&I<{cD}qv-v1_dFCy0D!<9gGjGXDEh{|1rDX#?O&K4mY=l=C z?zr$$_$q$%k5?kw)%(Ldxoeo=smaJJkCCx{z{ps>OWzC4Z21JcnbMvwQD(Pzj#Nvx zE~i!SjA1c1sl#Y-!~Cjw2+#LbpX%ofnfy1tuG$)ll`Z-;PcZ<#(#UO|{d#P{xeJW4 zVf^nJi<}lWX!(TkwVYvmd>yf3GepKFbM*TR_R1T^v#yZUz|JYN_YQ0WG0beidXn|j zh4C<}l^(9mX17}Hc8is8c8ATu=43n2X055IvDWfItsLR_K&*(prmK(`lvW4#lv|W`Tcv2&l2aV2p6X1}k*V zMDG%kz-YmOg1(6LOge@6)%V&l3u*ogS}~lfQfk zCNGdJr`_X3*lc!$h>V-PYHDygE(tE zk{Xe38`idMY%kk!$WtyKF;?lAq0`|OZ&F^R(|ZP;!T=|n=bE8YFq$yNd;ae7FD+vQ`+5Cl2xB$DX)4BpoGDDX0IxpA<%nWE|1sh^f-e)CTct`r`Hqm zxFHBputPqEnA~p3nxJr<0_)av+N_XI5w(Uz)!3Y2yEP=FBMF%GqR89)T5;Rm9;vCE zr|Arxrqkz_%jHL?y{G65XgY-t5+PT$6g%9M0(+HCzc3~e@z)29NWmp^I=t>6N6Xrr zaJ7~M&t4)lZhP3{^$5UD0i7Jh;&N*`-O%ag1S*L{)9JFEL8l7=w%Xi?yWJY8 zrJ&lK5usS83_1fa$QA$tCC=@I4-RKAh~-?lykRY-LI*38<#Jc)^dOCL1vOn~&{<70 zEEhTjqlFKAzG&26h#Ij*x6tYIdBT`8vAIwUR<{1nUREnEM-(*AXn5Yi4Zyh0jQ^#1%=vbmO@k5HT&KxF?xaG;q*eML+JEa zg2JJAJlGgD;!SRYx{gv8@l&6;y+Wt{Oamz#UT2JG1743mV5MY+13_QN=Wz%8(23Hs zd)?GgLMN)y>aj)TLkDv07RjSl!y7u|$h6bpjzh84MhLgf?Fhpldl(F;6|WyP?{Y_E zs7o$?6zqcW6rJ86LLDH7gdF7YG@TM~_Hub$&?(gf8JLyaxjpfC z+@+;7mL>d;pc5s6QyBkd_8-6?e1 z-64NGBy{?r(^dUWpv?wwr9#0#*zXI4ZQh_S5stF!*XIj`Qo(>9HSYJiL^Yug3GTBe z{Nz50$?u6!W}p*qlrh_zsS&(s7Zh`Tnx752u9(Z~cf`Ozb?OhIxZPf%Q^*O0lAsZc zHd{DME~8GO;!TzceLi2DD68)!*SI8J$}dapZ7!kHUlSEc$Yi3ODI?Rx0o*pBGa+<( z--=FmIur^<0vre7z|3DF5(~zlGc0tX+$q{FAIF6HX?bWmB~BM|?c-bkFLh3p&P7%JYp2J{Qe(G}qqztoX%R#s%#y@n{uoLM?LgdeB~H;P5pq?j z^#y#V=!^-Tx@@c~W7KtPIz8b)GK}DO1LUW>`kg?V4dBj%Lm}u4M;w&QR1`Wx{y-#@ zg1M;ifRD^TN$?rjZ|9_*V9!j`K^3}NZliq3qIj+5`j{{mykrP6vV61`8a5$Tbb!UuR zzn}bccp|}6#Ewh{Q7kl-W-nH=pwKb#5sn1|(U`*@4rF49P$C=%MI+g8h)T>A^t&m& zp&>jrxhobkm{W&)jJ3tz8_}xjjKj=(?f%aJ_VyA}o zr_*U_cDd@pk_e$Q79*DviC{vcm!u1Qfk4VP`#x0FQ^AmU_(Oi$q|)LF)+Qp6Xf$7+ z=+7GY!GJ;S<&B2YQQATNkhIh#yQ`Po&eM~{d_+7Hgw8-DkclV59Mlwwai&oyM8hF8 zLnohUI^|1`&l3uy0zp4?hC--hXP#rSy>5Tr?abO85(GL^9)HN0a!UhJ(@71@ptMKG zVShhDBp9*Z7blmK$xu?VH55j>$dx`#rv#k6pjPMe*9BeqsCQ^}9G!%))gnR@v9PqFek^N5+JjjX{G6QW8 z4rSmj4Z?8Pj!G_YTBpwwD0raQ3DSr&;7NM}VOJUqR21PD?F@e)o6UN)l*aPWY639v zkx0oEPNAgOB#3sAtIj|BK2p`k;fQzyv6JZV)C$JhR4f*c7aLL|1*2hJ$e@>ocF83i zH0~qN>D6+hfhd89uYmc9WF(wOIyjsoo65v8v2Y|2W0P`(22v#G#r{Gx!ecBuVFA{f14V_~>ke1SfU>A%I zM=C`wvpPK^FUX;4*5v}T@1qi96eu3d;-gN5&PZ)09#14njhT5Rqg2*(`V*1-DLQ=; zzIs*ZEGFXdR5YASIYaSqeY!4I7Y|31@j^TrML;7VZ#Wu^MrcVoonco_;za93!`VUabUM>%<`wGd zB6T9Y(O6uvEga4VC5iH0!f{op#Yhh7RGK#ttERKDsjkd+`$b{$(-la?>Qi*QLNOGm zuPQhKolbzigh7!^ERssQ!-+_JCL7NtBJp&xfoz7(SlAbdhvHE_b2=lgdSoT;3;JV} zuy6=EV-#zjyNR+J@P?aw?vld=(zq+^%lpGIcODG1w_{1C&l?OE3I)HG(o{o25+IH9 zOa^JrV(bAWl_ra-Sx_Gm;)Kq)#25$42jMt$`h?DyH7ks1ZpkicGFlc#4B8>VbiA0R z;TGojJts}y*$X7`c%UhrO4eaHrOq8mMoZazGM|jbGs#8@3$n5)+#Fzq#M=XU51f<$e+KP2`+3cJ- z#dF(??zIVn!GcIW-I{mPiAkeaSlTpux!t(JbMm=tF_Wq3j1ryyNU#Hs((u_C3X4FL5 z+Z+m{sZKLFH#JwHt*s5~vT}7Yl_?lKo?@|4u5@EPSEf!&V=~zqlSInaS}7c16v6g|OUvQ89>{!9aphex!hSjabKGsTiG zRiEx`Y{|D!NE;e@>a$rgt}Yc$=MuTPNH*)Cs_4wZbxse$ktD^|}``IrT z3#IzQ{vNjvq*-4o+!jgI`P#z4Ix7Ec!9&fJ!r)(2=U%ZpFZn7hyvD{Bx$0UF>V|B- zUg%4wI}(yYp))5j=5lp8`5=``QKd+=UuSQjv=;`4S~m9?!xv@@>aBQVzPr&I3Z?V( zp`%rX3iNsbF)U~ooAcSmW`Cww*WJ=yXfI~#o0|F?>apk(%4ec=^{M(?v_9|i)%kn! za6Oug)D z_6rA%MVHkZ^tjUPrJ;6zG@2{K|k`MBYoKTSv^;vTEV$`&Kd~xq(>_lMFgkG z<>I+C;fLNLysG@6@~g`CDt~VnZ+!fX|9<0xPq972FrHeb&8+EQ6YeIwz^;yo^@%tF`b1-7bBoXUh+QthL zTXWN;tk)O`IKOIw#+4%AXrG zM%&wR)$W>-{^8+AKF=4q@%XN>+_c)78=s!I zYS*Fhtz+$N>X^&9sIX{^Y{I<|*wko5qKanTFjX(N0?$#iut@v&4szft=ci!`oj>!N9!#+BPWO`47O=8m;JaOi#a`;7~?wz@AWT(s@H4bzrw ze00b%e(2Cm(}C9M=EB%?^S-C!FmT6oTVZT`y0t*UmaRS&fts#u@E3B2{$P;!!VAxn z>N9+{&G=Xw{C_ayrI2`vP19=ItlJ=Mq!9Y@c}dHA?=Kq{@?-kIstwiOIpf0AaiiSX zx^ddvDsLW`eG{3IHwR|locerg0nUyW#<$M=U$rYfec-}edmA~c{~M-j8hD?Zwv@JB zxP6yAx9vDo7=uE1X{_BaT^_?x-ZsO`@nds33BPSCMC=wetlBW$S=cijE-b8a8xN2) zjPG8vL4Q*9#nSkqX=Cg5nXjfh$N3f!89yW$BMB5-g;g8A%+9x`j`gyQqldkp8zmjn z(M4oRY5dTJi*`nuF{urw^1GhJ?*SSOX!m>4o zB<8{lLL+x*3F{&dYKrS%u(ukanm|()CbkuF{@lc&Z7dPJ@X)bx`Ou#6t-FRP2Zstv zE;>|Lvtg9X)CK=tseKZC&{(FHtzFpOhVof>te_6AI#yN(*KFGGWj{*;4zAsRwXua8 z35jBZ0cgST+(p8iYd7vXv~{D1wh@Jq{HtkIm}g9zg?Y!=#Omz7e+ z@w>CRuTXu8Q-!h%V#;nDRyM3kSa~{l*7B@jbw($?%J>HEC%G%!7R>Qhl1&q`OCwqF z$0wdV@zROP3Cq35zj53wPamGXbJ}w6=P|MNK>7IR?CuHwJ$K$?mOs1lvs*uF*?Lsn zc~pJs6ZY)g+@JhJB>M@|mi-6QlD+F=*6iPZ%$2>9=f{J+2-j)5(2k*{)P^s((R5E*;N@Ne;GMT;gmW#40 zZc&%svi}zI-dj}pmcfyUTTCuf8IYeaDs8Wv|+MQT9sp zuIv@iwsr5Gy{3O}ZtnwoEqg(5`E{30U3T4`sa=~lPhGtEf~lRGw@h8MdDGPP&F4*B zxOwB$hDGb9)-RfxT66f^snv&hCXZC|;0S{Twg^orr5st6o)rQl!G5%*Q zsQ-r^vhs%=u)j3?l~-6_wpj1zTwJ--{G~;)R?0&=@nq#B=f4}~7b~w2YO%$qR|{Qe zyn;32Kd?f|sJzO3G3Jk6Vy$TyJD6kUF7pWsTMf*wakSkZjcr&^T0%Q;xiM|5P;S<@ zt;HtPUmIJDhm0{}E4xOg;ldO6uB62{*EkQq9(-3BSF&=on|G6h{UU3e<{3Az67R3s z&wbqZC|d(MIq`5cSZ=^?uF+y_U~SiG)?M9Y{F>NS8vmr;!?*MPA2Rg+PgEB|)mEVz zuES}~arqvFmbk}IHRH&LQ+}PL-YVxL&xnj=2l(< z9;xhOACDV8xcK&$z!nX=HSE=}9}A5xc3Hak8?3wz9Af8>3qA(;vRHW@SOS}yZv}Er zD6m_*do}FWaG>%u{zH`~fWzQ)8zb6hwDLpTb1T0C9s!#NoDTp?#N`2}!1l_Gz!9kM z5a#1ZQ9IxIje*Kzz#;JadHW0CsP>s#c^UVS%I`^I(MSMGm0tl{G;C)LTYwZk3GCId zpZ-(;Y+nHmR(=Z{s+<50SAGHvggM}Z^s5Q(AAl_yc5B$H;XviH_zyy3hEzQV z9EQUg((@DcT@{I?pm|l$yehyM@#%(d1=1i;aYeEWCcXyx0$ zx#UiP^!yaAIV;D3uF4BQPvx7yfVNo}KSg4H5GXQGgc}LqDAHThye%4KI9W6%ps~oAcLFChTuPo6jn&${R>O5jL($lv zQ?e1x6pc+f#?3mN=V|{f$ZF9zAGs=W0aWW1v%%P+{kJ0F4e<6g zqXg#P0{xV)65Nae8P)(6(2!!ITYO4jE|I4K+u2KteN64{)vzC#EFoP;Hqs?<1a6dc zsVu=sc{`8Pmf++oz{MI)YPeLx)f%qVaD&FV5e}E&p`>9mC8A`Ur+v<+td-y!vTp3G zd>^=5$8|)f^Fc5)8a0%)M)>w?pbHus4L2o=J%t(uDdUas>feC{_|}Nrz5r~8OO42< z_zaNmjd1cM;IM`xm1l8}R(=eet7Dm`LzXK)!e>m!xRny!Xl#eijm9phXe2i!_9KL8 zB0VnyUF1j;Imr5CIOPHsw7*Dn6MTLe*rH*(_UYE{UJVDywI(?E60i&vP4H82F4jJi z+P#$AY(g?6jPSF`SWntG@&+24jE&I9`P~|Bro1=7Rq;7rzZI!yf~$gImrmgk_}qjX zzG5`P)z^V8_|Oa|zX1$Z9s*`4JI%-pXR|_!xQkftZHAUtfh`)gqpzBg8S&}WaDY5* zMp}ZvQM6DqbV)2_INS_B9|ca3@@A+LIH}=M4OhX9W@r@uHQK#ayQj2!0~9qIo6#!G zNc*pW+beef_rUpP^5P3Xp{NC^cpc~=d<*f4dn4&@fhPi`gtqH2k3;(8Id6;8Gj>ws@zpwylnl(i&q6#4IO7VLI<+(DsUq_>_9di2X5B!o(H8J)cTTIk&q6`oe#LP@=w4cXy*>&n>xk^p|leT zzaHq~t4`>>66mk|BQSu*=!9A~ut z$xdi|7Pyt1?SxWE!%nnBCuQLvaChYpa1Z&_3GEqU4ypQY;3#dzZmn~=;lOWki_Ymr za-If?&grJ4{0LZ&oOElQ)2($*x7In`=$zN_7oF3sbxt>wzKmORPPf)M-CE~#Yc1MM z{tC7+a;=-x{tCDq?cGf}<*VHq+Yu=3Ayt0>N_u)o&$GZl;eCefn(%&kCvhyEk!+W^(lNrih3x00@rH%8{uA$u?codo{;;HOG2&3fTz)uX;6?dNr4NHJ8|Rf^_w2F0nfYF7;|I^=dBl zYA&&xgfz1ki1hbrF7;}i+>04rA3od3C^E^;wsZVPp+O<$OKsww&f92n#POW?q7_1xxX5iicIwA@zpdkm~&jUbd z^$n0hf$ik)04WrAuZ9Dh#4~`#NCAhTb%50RfTP4aKsuiSj#07($m>Udi#43oaH)o? z;MD**E^pUp_gd|q((ZNo+YQL}06OG%z)h8Vft$(q0m_&7Y(YK;bom+}FTRF*CoRbV zbn+K~M=JLNAAnZ_=#wn)LE2!0a6@)siS8YQ13w04v|BXrAe6oWl-BhiRQv~UOuI!7 z4-%Jzks57~7@q?kA%#Oop%>^PcZT3H?REJ4I#BpbZA99Jh~;@;J$xI2&p!ngDKA6t z`6XbBhEi&Vj5%n4A-FC6y&4Xn&4&2Pat}k%kd}=hxShvcMkfrB&ffqh;M)+~7C5Ql zQVmzZt0A~8{%f>*t#(go_d2K^LSsJ*+)_CS6sIpAvTvqrnu zYWI|OuY<$Gx+OELOVcn^{}dl7N5fDpy_(&$sE48V-+^k}!ATo|Dw z(2FC46IjsxMaswsG(HP#(XgGmW&|3=r&q%P{gt$GNBEN-)F@PsQ0fJnv;;<=?nU5Y z4JS2Rs^Mx4*J`){sT-lZ`~fKS(FnRi@SIoqFW~t)J==BKc9J6_Xo)oNLAW;xEk6Rf ziG5US33|V@$41G!&jT~?M0#`yV4?CbQ2OJe(Dh?ri-zrJ=24{gkHBv2)2rbCwxLJK z!8~x7T6>f@BS0{5&qaPlq4C$iF&%yaK954Fz)204YA70mu?_7OjWJ41Az?&gjB=v) z^FYxUqiBg&fLq9sQKzaq|5o;Cb3- z3$cuAJmb{SPvYJUoFGr10tVpH1Q?zHO6zWd7Rbv$>3vTy;^qQw(qT5EuO?`Lh|l?? zY65Qmim^O5eXu2zPZ!WnUM!)!dA3D|7 z2Exc7dA$TZ69(=fmzSVd>ww>+r?do_e92g*`LIm$a2Y&&4xf6`zYHpV1r#1GgAcC) z&(qHCg|s@<)p?1EWoAZVE7Gi0!dg7Hv~>#eZZ-5^1XqC>RRXUGWk+zrd*+jWmMcQ5jO4?SDHVL^K z%&Woh6i{+`wU&_8aPqgf>q+@)jb}A@eveydT&?qZHQ2;Q@_Mz#xmx2~4bEqbH5%s{ zjdP90xkk&+8lAQ^8s{2~bB>H5%s{jdKk+Uj&1sbB)HiM&n!y59^pq@sR&hT9&5B z_eXFC>7P!4`G>$VaytdbUIT7K*G-Z8A)v_86uB=x+mV(jc=#M}H|>WhIQfFH9-RLU z6rHmkJkJ1Sq-Z_)@_XPUWokXLDp2~W>vb&a!5qLX^0^+IPXiw$_Kl>|0Sq9Y8%g0) zKpCUh2< z7vYEnStkvfi0kJ-iEERlViTBO!!0;B@fYA0oSQVxP4MKGxCQ4XaQ>cm!hy|v`y5bu zotsIgK zoth{Kl=1NGq(PwcdAFm7p9c0)9=97ZGPxbhUjq(;Z9BUCKHxBTwo?ncfuoGgZl~Ue z0FMB768;2G#+-NZ_DSl?BJJ2+#PuAoMMJ6UcM+HP^lCVSgzut$4**AzgRM^94!@U> z-^FJx{XWYBU!D%#%gpqb8a~-s5j%nR>4Bho4ZW)O^ z28QQ=8_DHkXszD>&(m&^(qrKH1yHp8gQW90pp3gdNKNDcZUsKBF+Z*`Kd!anF;uH`ZC9uN(cS5Ih3LwKrvg8=o8n`cgxWNuBXjgWR$!_ z-QPrevjr;?ZIs*&#((A*U5vEII+;F7?f|Kk-k$UYXhC8_uxu<~=5G;P7^fAom{~nB zNxKXVoD26?pj}o$^%`c=rl4{?Gl8PFH=|q8WX1*L{x)SYQ}`|8C$ui6jr)u*8DC&d z@g`;xPZ(g>!1&!(8ImjN6T8nPa?#GfDr>_>A!hRbw17ermki_@ME7<5lDR z#)plAoTc>y_EA1&95w!6yoR-myNu6qw$(oypC>1_bMoay#=pYtf8lJbe>1*gJZd~< z{1%<^eWd2Q#=Yd-%apYr89%_@<}Pe~ykOkSdb!=qfBqG@{MW{vpm! z`T2Lo)y6*K8snYDyNqj%`;EWHs^WFV0po9s=ZzPQuNXg8wZ_kluPQ8YDZBBKawwGn(9`*vJ@>E0{%?6`dQ zrI)*RUV7!_vp+mLc3-^firHWC+5c(p++wRbt}wjM@dbRv_Zs6E6O<@Tt>98YC`u`9 z!Ho+|A{4b%q~@wZXlNACR#Bz&v3c`D`qrq=QI%dulO`3tkTk7&NduHpD8_&dw!vUK zU`#CaY5M(Z_CDuqbL?}Bk1Za&mS*;4_MYpSHEY(I*_*GsZYbLQ#BSVP+`badpV({u zK80`Z?CP>(SJyTjyE;2Np(6doGYO?6SheU^K9OR3iG1yZj&?ym-@qlH`1_zt(WR)en^x@OuJpA@)3r#`k~E!wGy)2t zoHi$s|49pLO&NyWmC{`xX)0ByH3%C|8PVewZE}&1}y6!%5=iMcGz2`p{DeIL5OfnWVsZZhtsOvGfpZMRf zyG&jdiT{xHja2%+{KKTK^!bzNZ3t}z&Ql|l-e_@Fx)V0`R5Qom-w9B`0B+Q$=l(%o z_|Tto_eOM9*kjbkh_#kfdZC6PT4xIRTy`b{=w&K8FF@*A|59i1l#w2^&s<>uUpq1k zNM96s7K)JUuMzt?`6(1+rhhg}e~8Fa=_?^1zBP6>=WRCDHXl zWCCs*(wmQ+*6)WeToJd8`Xh8Wu5*)H=3N)0a0zz`uA`JxR*k>s7ov1I<6Obqs*2QO zb&&I|c|8DCiT|nmk^Fgv`aZK*{Ezw`r$@a>ssDrfN&BHbX2 zhi*>ublEG*i7i$hvbnh-ac`2ycW*i0V0S>6J5uTY5pjVLJ6Tg7#Fy+E&TZ))4ykm~__*4w z0SW)#Sl$fWZ-~uWz&M$>*_6dK6>k^+^pd~uH4wJOIZ;$N&RYvdDJwkA5u%X%kF>Gp zT35q)2CqU{{|eLYhsHh4iC$J=8#xC3|2Z6QYk0@_gTMBapCw1|4FU3sp;3H;_4tqA zdaDR(LEc+y59zs6%st0gbr!JNOf&8Y)@W6-T8j?^xZgvwz4TiU&LNqkf@l176u}Hf z_?E{Wc<)a+@1c~fU^N;;zJfZ#YYTFl6(#|8`r8=baN->2jQ>vIMOnJDwV$-QV|V$fxy8{&TOvb$jg2C{&VT%*)1? zp_?PD_%VLzenB2G;$Uo2S~k8|Ps?6@&AI&;8Dze#cjIu=_%n0)GhT#e_gl?Za>%)pcEyjwv6hK$Uaq@>fqEizut7T2iFtXTdT+xE8 zR?72P!ZAy&rLkpEuuls5gX?AIY5dpipC*U?q{NS#gK zE+ElJ<^eOqkwc;XG{BdVPy;(CxVH@}M-w{cZsgM)*fd(OX?z{qiR{pKW7GI1`s6*} zy}^%zpJ7LN9lOI9v3~s)+sHxiA@tCH$1d^#_!u?^ELr>&_c->DKJanu1ZS~|^atm$ zj3h|&(44F`=}c#yNy{!M!e!ct(v~7WkM-6fq%M0p?zO}(3v|^)=^|`_23taG!!{*c zX_hJNco7D;dqY$P>Zj$xmr^%NLgX_+aLx$DMbpq2K9|0uGu2TEZaKc}4#ilLwwUcf zp{l=)gp_jDNDpZ=9i#=sJpIYR1ApDZHW6S=^KhRXHkto<{B^ia+-FmEw#``Dw90M` z>3irv+ucH|tfEHhp|ZQE7xn^KO*BAbt!A~8El(|7MH#B47xJ<>5`kobT2iW{{Br8s z;?K>D@!3JMk=a1p!o&TPF2V;=rHn%TaUE%URC(8jxWNKDu&<<1mPwCyQA%MGrEEx{ zzQ@rXqFSoRo{6U>&6{_kAkl;@NXgnMwPM|a^=-7s!|<6Ac2NF`kz@*fIp$6?9~g1( zFthm>yT9tMnYwPKZdcRF^|Z#Kg2}f>ZT57G9F4`=PVE6f*1@x6=jxcL>vczG+_b4b)gDrn!4M~-nmm=SZ8Nwu=utg?C4 z2sJ#S+>={Foq31J}}4 z`;X1APf*9htTG7!3XGQ^3P>GAA;dRqbnWHZR9FE{9tq>nKk@{%@@$-Etk-#N$dpnt zH3qrg^iQPZ&>3HVHqSx*L$v!ClB~_r^3jt=`jIH&eBOzkjgA?5U zyYX{_w6OqV#gC{*!`v_3N*|pbE9(_=gLcQGk!JSSqt=~U3+Il0mM0`d&k9Ia??6M9 ztlw-2Bs0j4bAHxWd>}E$^b?Y33l8or-$v5gEH%|v&mAJG$GA7M>`WEb>e`9dMMF;ZdZk);fCyhJee)F6{1 zhw?}X*vT^k8(s8K<7O4gjXwIaqi&n%( z>*2Nbo$v8vtYqJc?)6DqA+9f@KFgZ#@37kY1zY9)BI~+)SQUPN_3268lXj6GvVbdz zS(bWzrAhk)D)ntHu+lVa^=N6Nr;$Bd>sR>!5xS=~`083vJB2r+o6_#uBrBI6K%4bB zuo!*g7Bp5{!7_67I4L{{R*<`=(MLVQ3icJ`aW`>43s#fYZ{sV!b>#R3Qu{90#QOB_ zBXhk7uA&4#2Nu0Ne9@z$$lx3#IdSBA|ZLRUy663Q)#%GI- z!&VrFEj12X#{M6D)kS=^jGaKwaV~CKZ``)dcx$Qg*1B{*r2o+mi|UGAUFwIoEln+D zZ0az*!v!&K&tE|tOy@R{z zvn#?rt8uc%dTY{pYmxQVV(YCXmR6bd)^h8u%dMX-w;oz)J+#7lXu0*!3i9Fk$O_BN z&3vTB@|4L(^p(muAE`AyQkTI;>gT~nsx6ld8GNLHW=Y`6*=Kkpn9Cl#rl9Bxk8N)c z+P<{w(e~h;M|bULM-uV7^^$hfZc(H;_U~yQ9`c)=$=Y4EZ||O`f=%XcF@IYYpZ$oz zSF|fJc*Oj#SzaY)`5k}>;`h0iPn!4%Qmi%<|GkrI-Iaa4l%1Xm-zjbx-rHzL@%RSh i-8->v4-jWJ&z!g8!>p7@a(xzmCu=2=*mD&}_x}NiNO=|j diff --git a/www/bootstrap-3.3.1/css/journal.min.css b/www/bootstrap-3.3.1/css/journal.min.css deleted file mode 100644 index 1aa3ec8..0000000 --- a/www/bootstrap-3.3.1/css/journal.min.css +++ /dev/null @@ -1,20 +0,0 @@ -@font-face { - font-family: 'News Cycle'; - font-style: normal; - font-weight: 400; - src: url(fonts/NewsCycle.ttf) format('truetype'); -} -@font-face { - font-family: 'News Cycle'; - font-style: normal; - font-weight: 700; - src: url(fonts/NewsCycleBold.ttf) format('truetype'); -} - -/*! - * bootswatch v3.3.1+1 - * Homepage: http://bootswatch.com - * Copyright 2012-2014 Thomas Park - * Licensed under MIT - * Based on Bootstrap -*//*! normalize.css v3.0.2 | MIT License | git.io/normalize */html{font-family:sans-serif;-ms-text-size-adjust:100%;-webkit-text-size-adjust:100%}body{margin:0}article,aside,details,figcaption,figure,footer,header,hgroup,main,menu,nav,section,summary{display:block}audio,canvas,progress,video{display:inline-block;vertical-align:baseline}audio:not([controls]){display:none;height:0}[hidden],template{display:none}a{background-color:transparent}a:active,a:hover{outline:0}abbr[title]{border-bottom:1px dotted}b,strong{font-weight:bold}dfn{font-style:italic}h1{font-size:2em;margin:0.67em 0}mark{background:#ff0;color:#000}small{font-size:80%}sub,sup{font-size:75%;line-height:0;position:relative;vertical-align:baseline}sup{top:-0.5em}sub{bottom:-0.25em}img{border:0}svg:not(:root){overflow:hidden}figure{margin:1em 40px}hr{-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box;height:0}pre{overflow:auto}code,kbd,pre,samp{font-family:monospace, monospace;font-size:1em}button,input,optgroup,select,textarea{color:inherit;font:inherit;margin:0}button{overflow:visible}button,select{text-transform:none}button,html input[type="button"],input[type="reset"],input[type="submit"]{-webkit-appearance:button;cursor:pointer}button[disabled],html input[disabled]{cursor:default}button::-moz-focus-inner,input::-moz-focus-inner{border:0;padding:0}input{line-height:normal}input[type="checkbox"],input[type="radio"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box;padding:0}input[type="number"]::-webkit-inner-spin-button,input[type="number"]::-webkit-outer-spin-button{height:auto}input[type="search"]{-webkit-appearance:textfield;-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box}input[type="search"]::-webkit-search-cancel-button,input[type="search"]::-webkit-search-decoration{-webkit-appearance:none}fieldset{border:1px solid #c0c0c0;margin:0 2px;padding:0.35em 0.625em 0.75em}legend{border:0;padding:0}textarea{overflow:auto}optgroup{font-weight:bold}table{border-collapse:collapse;border-spacing:0}td,th{padding:0}/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */@media print{*,*:before,*:after{background:transparent !important;color:#000 !important;-webkit-box-shadow:none !important;box-shadow:none !important;text-shadow:none !important}a,a:visited{text-decoration:underline}a[href]:after{content:" (" attr(href) ")"}abbr[title]:after{content:" (" attr(title) ")"}a[href^="#"]:after,a[href^="javascript:"]:after{content:""}pre,blockquote{border:1px solid #999;page-break-inside:avoid}thead{display:table-header-group}tr,img{page-break-inside:avoid}img{max-width:100% !important}p,h2,h3{orphans:3;widows:3}h2,h3{page-break-after:avoid}select{background:#fff !important}.navbar{display:none}.btn>.caret,.dropup>.btn>.caret{border-top-color:#000 !important}.label{border:1px solid #000}.table{border-collapse:collapse !important}.table td,.table th{background-color:#fff !important}.table-bordered th,.table-bordered td{border:1px solid #ddd !important}}@font-face{font-family:'Glyphicons Halflings';src:url('../fonts/glyphicons-halflings-regular.eot');src:url('../fonts/glyphicons-halflings-regular.eot?#iefix') format('embedded-opentype'),url('../fonts/glyphicons-halflings-regular.woff') format('woff'),url('../fonts/glyphicons-halflings-regular.ttf') format('truetype'),url('../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular') format('svg')}.glyphicon{position:relative;top:1px;display:inline-block;font-family:'Glyphicons Halflings';font-style:normal;font-weight:normal;line-height:1;-webkit-font-smoothing:antialiased;-moz-osx-font-smoothing:grayscale}.glyphicon-asterisk:before{content:"\2a"}.glyphicon-plus:before{content:"\2b"}.glyphicon-euro:before,.glyphicon-eur:before{content:"\20ac"}.glyphicon-minus:before{content:"\2212"}.glyphicon-cloud:before{content:"\2601"}.glyphicon-envelope:before{content:"\2709"}.glyphicon-pencil:before{content:"\270f"}.glyphicon-glass:before{content:"\e001"}.glyphicon-music:before{content:"\e002"}.glyphicon-search:before{content:"\e003"}.glyphicon-heart:before{content:"\e005"}.glyphicon-star:before{content:"\e006"}.glyphicon-star-empty:before{content:"\e007"}.glyphicon-user:before{content:"\e008"}.glyphicon-film:before{content:"\e009"}.glyphicon-th-large:before{content:"\e010"}.glyphicon-th:before{content:"\e011"}.glyphicon-th-list:before{content:"\e012"}.glyphicon-ok:before{content:"\e013"}.glyphicon-remove:before{content:"\e014"}.glyphicon-zoom-in:before{content:"\e015"}.glyphicon-zoom-out:before{content:"\e016"}.glyphicon-off:before{content:"\e017"}.glyphicon-signal:before{content:"\e018"}.glyphicon-cog:before{content:"\e019"}.glyphicon-trash:before{content:"\e020"}.glyphicon-home:before{content:"\e021"}.glyphicon-file:before{content:"\e022"}.glyphicon-time:before{content:"\e023"}.glyphicon-road:before{content:"\e024"}.glyphicon-download-alt:before{content:"\e025"}.glyphicon-download:before{content:"\e026"}.glyphicon-upload:before{content:"\e027"}.glyphicon-inbox:before{content:"\e028"}.glyphicon-play-circle:before{content:"\e029"}.glyphicon-repeat:before{content:"\e030"}.glyphicon-refresh:before{content:"\e031"}.glyphicon-list-alt:before{content:"\e032"}.glyphicon-lock:before{content:"\e033"}.glyphicon-flag:before{content:"\e034"}.glyphicon-headphones:before{content:"\e035"}.glyphicon-volume-off:before{content:"\e036"}.glyphicon-volume-down:before{content:"\e037"}.glyphicon-volume-up:before{content:"\e038"}.glyphicon-qrcode:before{content:"\e039"}.glyphicon-barcode:before{content:"\e040"}.glyphicon-tag:before{content:"\e041"}.glyphicon-tags:before{content:"\e042"}.glyphicon-book:before{content:"\e043"}.glyphicon-bookmark:before{content:"\e044"}.glyphicon-print:before{content:"\e045"}.glyphicon-camera:before{content:"\e046"}.glyphicon-font:before{content:"\e047"}.glyphicon-bold:before{content:"\e048"}.glyphicon-italic:before{content:"\e049"}.glyphicon-text-height:before{content:"\e050"}.glyphicon-text-width:before{content:"\e051"}.glyphicon-align-left:before{content:"\e052"}.glyphicon-align-center:before{content:"\e053"}.glyphicon-align-right:before{content:"\e054"}.glyphicon-align-justify:before{content:"\e055"}.glyphicon-list:before{content:"\e056"}.glyphicon-indent-left:before{content:"\e057"}.glyphicon-indent-right:before{content:"\e058"}.glyphicon-facetime-video:before{content:"\e059"}.glyphicon-picture:before{content:"\e060"}.glyphicon-map-marker:before{content:"\e062"}.glyphicon-adjust:before{content:"\e063"}.glyphicon-tint:before{content:"\e064"}.glyphicon-edit:before{content:"\e065"}.glyphicon-share:before{content:"\e066"}.glyphicon-check:before{content:"\e067"}.glyphicon-move:before{content:"\e068"}.glyphicon-step-backward:before{content:"\e069"}.glyphicon-fast-backward:before{content:"\e070"}.glyphicon-backward:before{content:"\e071"}.glyphicon-play:before{content:"\e072"}.glyphicon-pause:before{content:"\e073"}.glyphicon-stop:before{content:"\e074"}.glyphicon-forward:before{content:"\e075"}.glyphicon-fast-forward:before{content:"\e076"}.glyphicon-step-forward:before{content:"\e077"}.glyphicon-eject:before{content:"\e078"}.glyphicon-chevron-left:before{content:"\e079"}.glyphicon-chevron-right:before{content:"\e080"}.glyphicon-plus-sign:before{content:"\e081"}.glyphicon-minus-sign:before{content:"\e082"}.glyphicon-remove-sign:before{content:"\e083"}.glyphicon-ok-sign:before{content:"\e084"}.glyphicon-question-sign:before{content:"\e085"}.glyphicon-info-sign:before{content:"\e086"}.glyphicon-screenshot:before{content:"\e087"}.glyphicon-remove-circle:before{content:"\e088"}.glyphicon-ok-circle:before{content:"\e089"}.glyphicon-ban-circle:before{content:"\e090"}.glyphicon-arrow-left:before{content:"\e091"}.glyphicon-arrow-right:before{content:"\e092"}.glyphicon-arrow-up:before{content:"\e093"}.glyphicon-arrow-down:before{content:"\e094"}.glyphicon-share-alt:before{content:"\e095"}.glyphicon-resize-full:before{content:"\e096"}.glyphicon-resize-small:before{content:"\e097"}.glyphicon-exclamation-sign:before{content:"\e101"}.glyphicon-gift:before{content:"\e102"}.glyphicon-leaf:before{content:"\e103"}.glyphicon-fire:before{content:"\e104"}.glyphicon-eye-open:before{content:"\e105"}.glyphicon-eye-close:before{content:"\e106"}.glyphicon-warning-sign:before{content:"\e107"}.glyphicon-plane:before{content:"\e108"}.glyphicon-calendar:before{content:"\e109"}.glyphicon-random:before{content:"\e110"}.glyphicon-comment:before{content:"\e111"}.glyphicon-magnet:before{content:"\e112"}.glyphicon-chevron-up:before{content:"\e113"}.glyphicon-chevron-down:before{content:"\e114"}.glyphicon-retweet:before{content:"\e115"}.glyphicon-shopping-cart:before{content:"\e116"}.glyphicon-folder-close:before{content:"\e117"}.glyphicon-folder-open:before{content:"\e118"}.glyphicon-resize-vertical:before{content:"\e119"}.glyphicon-resize-horizontal:before{content:"\e120"}.glyphicon-hdd:before{content:"\e121"}.glyphicon-bullhorn:before{content:"\e122"}.glyphicon-bell:before{content:"\e123"}.glyphicon-certificate:before{content:"\e124"}.glyphicon-thumbs-up:before{content:"\e125"}.glyphicon-thumbs-down:before{content:"\e126"}.glyphicon-hand-right:before{content:"\e127"}.glyphicon-hand-left:before{content:"\e128"}.glyphicon-hand-up:before{content:"\e129"}.glyphicon-hand-down:before{content:"\e130"}.glyphicon-circle-arrow-right:before{content:"\e131"}.glyphicon-circle-arrow-left:before{content:"\e132"}.glyphicon-circle-arrow-up:before{content:"\e133"}.glyphicon-circle-arrow-down:before{content:"\e134"}.glyphicon-globe:before{content:"\e135"}.glyphicon-wrench:before{content:"\e136"}.glyphicon-tasks:before{content:"\e137"}.glyphicon-filter:before{content:"\e138"}.glyphicon-briefcase:before{content:"\e139"}.glyphicon-fullscreen:before{content:"\e140"}.glyphicon-dashboard:before{content:"\e141"}.glyphicon-paperclip:before{content:"\e142"}.glyphicon-heart-empty:before{content:"\e143"}.glyphicon-link:before{content:"\e144"}.glyphicon-phone:before{content:"\e145"}.glyphicon-pushpin:before{content:"\e146"}.glyphicon-usd:before{content:"\e148"}.glyphicon-gbp:before{content:"\e149"}.glyphicon-sort:before{content:"\e150"}.glyphicon-sort-by-alphabet:before{content:"\e151"}.glyphicon-sort-by-alphabet-alt:before{content:"\e152"}.glyphicon-sort-by-order:before{content:"\e153"}.glyphicon-sort-by-order-alt:before{content:"\e154"}.glyphicon-sort-by-attributes:before{content:"\e155"}.glyphicon-sort-by-attributes-alt:before{content:"\e156"}.glyphicon-unchecked:before{content:"\e157"}.glyphicon-expand:before{content:"\e158"}.glyphicon-collapse-down:before{content:"\e159"}.glyphicon-collapse-up:before{content:"\e160"}.glyphicon-log-in:before{content:"\e161"}.glyphicon-flash:before{content:"\e162"}.glyphicon-log-out:before{content:"\e163"}.glyphicon-new-window:before{content:"\e164"}.glyphicon-record:before{content:"\e165"}.glyphicon-save:before{content:"\e166"}.glyphicon-open:before{content:"\e167"}.glyphicon-saved:before{content:"\e168"}.glyphicon-import:before{content:"\e169"}.glyphicon-export:before{content:"\e170"}.glyphicon-send:before{content:"\e171"}.glyphicon-floppy-disk:before{content:"\e172"}.glyphicon-floppy-saved:before{content:"\e173"}.glyphicon-floppy-remove:before{content:"\e174"}.glyphicon-floppy-save:before{content:"\e175"}.glyphicon-floppy-open:before{content:"\e176"}.glyphicon-credit-card:before{content:"\e177"}.glyphicon-transfer:before{content:"\e178"}.glyphicon-cutlery:before{content:"\e179"}.glyphicon-header:before{content:"\e180"}.glyphicon-compressed:before{content:"\e181"}.glyphicon-earphone:before{content:"\e182"}.glyphicon-phone-alt:before{content:"\e183"}.glyphicon-tower:before{content:"\e184"}.glyphicon-stats:before{content:"\e185"}.glyphicon-sd-video:before{content:"\e186"}.glyphicon-hd-video:before{content:"\e187"}.glyphicon-subtitles:before{content:"\e188"}.glyphicon-sound-stereo:before{content:"\e189"}.glyphicon-sound-dolby:before{content:"\e190"}.glyphicon-sound-5-1:before{content:"\e191"}.glyphicon-sound-6-1:before{content:"\e192"}.glyphicon-sound-7-1:before{content:"\e193"}.glyphicon-copyright-mark:before{content:"\e194"}.glyphicon-registration-mark:before{content:"\e195"}.glyphicon-cloud-download:before{content:"\e197"}.glyphicon-cloud-upload:before{content:"\e198"}.glyphicon-tree-conifer:before{content:"\e199"}.glyphicon-tree-deciduous:before{content:"\e200"}*{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}*:before,*:after{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}html{font-size:10px;-webkit-tap-highlight-color:rgba(0,0,0,0)}body{font-family:Georgia,"Times New Roman",Times,serif;font-size:15px;line-height:1.42857143;color:#777777;background-color:#ffffff}input,button,select,textarea{font-family:inherit;font-size:inherit;line-height:inherit}a{color:#eb6864;text-decoration:none}a:hover,a:focus{color:#e22620;text-decoration:underline}a:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}figure{margin:0}img{vertical-align:middle}.img-responsive,.thumbnail>img,.thumbnail a>img,.carousel-inner>.item>img,.carousel-inner>.item>a>img{display:block;max-width:100%;height:auto}.img-rounded{border-radius:6px}.img-thumbnail{padding:4px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:all .2s ease-in-out;-o-transition:all .2s ease-in-out;transition:all .2s ease-in-out;display:inline-block;max-width:100%;height:auto}.img-circle{border-radius:50%}hr{margin-top:21px;margin-bottom:21px;border:0;border-top:1px solid #eeeeee}.sr-only{position:absolute;width:1px;height:1px;margin:-1px;padding:0;overflow:hidden;clip:rect(0, 0, 0, 0);border:0}.sr-only-focusable:active,.sr-only-focusable:focus{position:static;width:auto;height:auto;margin:0;overflow:visible;clip:auto}h1,h2,h3,h4,h5,h6,.h1,.h2,.h3,.h4,.h5,.h6{font-family:"News Cycle","Arial Narrow Bold",sans-serif;font-weight:700;line-height:1.1;color:#000000}h1 small,h2 small,h3 small,h4 small,h5 small,h6 small,.h1 small,.h2 small,.h3 small,.h4 small,.h5 small,.h6 small,h1 .small,h2 .small,h3 .small,h4 .small,h5 .small,h6 .small,.h1 .small,.h2 .small,.h3 .small,.h4 .small,.h5 .small,.h6 .small{font-weight:normal;line-height:1;color:#999999}h1,.h1,h2,.h2,h3,.h3{margin-top:21px;margin-bottom:10.5px}h1 small,.h1 small,h2 small,.h2 small,h3 small,.h3 small,h1 .small,.h1 .small,h2 .small,.h2 .small,h3 .small,.h3 .small{font-size:65%}h4,.h4,h5,.h5,h6,.h6{margin-top:10.5px;margin-bottom:10.5px}h4 small,.h4 small,h5 small,.h5 small,h6 small,.h6 small,h4 .small,.h4 .small,h5 .small,.h5 .small,h6 .small,.h6 .small{font-size:75%}h1,.h1{font-size:39px}h2,.h2{font-size:32px}h3,.h3{font-size:26px}h4,.h4{font-size:19px}h5,.h5{font-size:15px}h6,.h6{font-size:13px}p{margin:0 0 10.5px}.lead{margin-bottom:21px;font-size:17px;font-weight:300;line-height:1.4}@media (min-width:768px){.lead{font-size:22.5px}}small,.small{font-size:86%}mark,.mark{background-color:#fcf8e3;padding:.2em}.text-left{text-align:left}.text-right{text-align:right}.text-center{text-align:center}.text-justify{text-align:justify}.text-nowrap{white-space:nowrap}.text-lowercase{text-transform:lowercase}.text-uppercase{text-transform:uppercase}.text-capitalize{text-transform:capitalize}.text-muted{color:#999999}.text-primary{color:#eb6864}a.text-primary:hover{color:#e53c37}.text-success{color:#468847}a.text-success:hover{color:#356635}.text-info{color:#3a87ad}a.text-info:hover{color:#2d6987}.text-warning{color:#c09853}a.text-warning:hover{color:#a47e3c}.text-danger{color:#b94a48}a.text-danger:hover{color:#953b39}.bg-primary{color:#fff;background-color:#eb6864}a.bg-primary:hover{background-color:#e53c37}.bg-success{background-color:#dff0d8}a.bg-success:hover{background-color:#c1e2b3}.bg-info{background-color:#d9edf7}a.bg-info:hover{background-color:#afd9ee}.bg-warning{background-color:#fcf8e3}a.bg-warning:hover{background-color:#f7ecb5}.bg-danger{background-color:#f2dede}a.bg-danger:hover{background-color:#e4b9b9}.page-header{padding-bottom:9.5px;margin:42px 0 21px;border-bottom:1px solid #eeeeee}ul,ol{margin-top:0;margin-bottom:10.5px}ul ul,ol ul,ul ol,ol ol{margin-bottom:0}.list-unstyled{padding-left:0;list-style:none}.list-inline{padding-left:0;list-style:none;margin-left:-5px}.list-inline>li{display:inline-block;padding-left:5px;padding-right:5px}dl{margin-top:0;margin-bottom:21px}dt,dd{line-height:1.42857143}dt{font-weight:bold}dd{margin-left:0}@media (min-width:768px){.dl-horizontal dt{float:left;width:160px;clear:left;text-align:right;overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.dl-horizontal dd{margin-left:180px}}abbr[title],abbr[data-original-title]{cursor:help;border-bottom:1px dotted #999999}.initialism{font-size:90%;text-transform:uppercase}blockquote{padding:10.5px 21px;margin:0 0 21px;font-size:18.75px;border-left:5px solid #eeeeee}blockquote p:last-child,blockquote ul:last-child,blockquote ol:last-child{margin-bottom:0}blockquote footer,blockquote small,blockquote .small{display:block;font-size:80%;line-height:1.42857143;color:#999999}blockquote footer:before,blockquote small:before,blockquote .small:before{content:'\2014 \00A0'}.blockquote-reverse,blockquote.pull-right{padding-right:15px;padding-left:0;border-right:5px solid #eeeeee;border-left:0;text-align:right}.blockquote-reverse footer:before,blockquote.pull-right footer:before,.blockquote-reverse small:before,blockquote.pull-right small:before,.blockquote-reverse .small:before,blockquote.pull-right .small:before{content:''}.blockquote-reverse footer:after,blockquote.pull-right footer:after,.blockquote-reverse small:after,blockquote.pull-right small:after,.blockquote-reverse .small:after,blockquote.pull-right .small:after{content:'\00A0 \2014'}address{margin-bottom:21px;font-style:normal;line-height:1.42857143}code,kbd,pre,samp{font-family:monospace}code{padding:2px 4px;font-size:90%;color:#c7254e;background-color:#f9f2f4;border-radius:4px}kbd{padding:2px 4px;font-size:90%;color:#ffffff;background-color:#333333;border-radius:3px;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25)}kbd kbd{padding:0;font-size:100%;font-weight:bold;-webkit-box-shadow:none;box-shadow:none}pre{display:block;padding:10px;margin:0 0 10.5px;font-size:14px;line-height:1.42857143;word-break:break-all;word-wrap:break-word;color:#333333;background-color:#f5f5f5;border:1px solid #cccccc;border-radius:4px}pre code{padding:0;font-size:inherit;color:inherit;white-space:pre-wrap;background-color:transparent;border-radius:0}.pre-scrollable{max-height:340px;overflow-y:scroll}.container{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}@media (min-width:768px){.container{width:750px}}@media (min-width:992px){.container{width:970px}}@media (min-width:1200px){.container{width:1170px}}.container-fluid{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}.row{margin-left:-15px;margin-right:-15px}.col-xs-1,.col-sm-1,.col-md-1,.col-lg-1,.col-xs-2,.col-sm-2,.col-md-2,.col-lg-2,.col-xs-3,.col-sm-3,.col-md-3,.col-lg-3,.col-xs-4,.col-sm-4,.col-md-4,.col-lg-4,.col-xs-5,.col-sm-5,.col-md-5,.col-lg-5,.col-xs-6,.col-sm-6,.col-md-6,.col-lg-6,.col-xs-7,.col-sm-7,.col-md-7,.col-lg-7,.col-xs-8,.col-sm-8,.col-md-8,.col-lg-8,.col-xs-9,.col-sm-9,.col-md-9,.col-lg-9,.col-xs-10,.col-sm-10,.col-md-10,.col-lg-10,.col-xs-11,.col-sm-11,.col-md-11,.col-lg-11,.col-xs-12,.col-sm-12,.col-md-12,.col-lg-12{position:relative;min-height:1px;padding-left:15px;padding-right:15px}.col-xs-1,.col-xs-2,.col-xs-3,.col-xs-4,.col-xs-5,.col-xs-6,.col-xs-7,.col-xs-8,.col-xs-9,.col-xs-10,.col-xs-11,.col-xs-12{float:left}.col-xs-12{width:100%}.col-xs-11{width:91.66666667%}.col-xs-10{width:83.33333333%}.col-xs-9{width:75%}.col-xs-8{width:66.66666667%}.col-xs-7{width:58.33333333%}.col-xs-6{width:50%}.col-xs-5{width:41.66666667%}.col-xs-4{width:33.33333333%}.col-xs-3{width:25%}.col-xs-2{width:16.66666667%}.col-xs-1{width:8.33333333%}.col-xs-pull-12{right:100%}.col-xs-pull-11{right:91.66666667%}.col-xs-pull-10{right:83.33333333%}.col-xs-pull-9{right:75%}.col-xs-pull-8{right:66.66666667%}.col-xs-pull-7{right:58.33333333%}.col-xs-pull-6{right:50%}.col-xs-pull-5{right:41.66666667%}.col-xs-pull-4{right:33.33333333%}.col-xs-pull-3{right:25%}.col-xs-pull-2{right:16.66666667%}.col-xs-pull-1{right:8.33333333%}.col-xs-pull-0{right:auto}.col-xs-push-12{left:100%}.col-xs-push-11{left:91.66666667%}.col-xs-push-10{left:83.33333333%}.col-xs-push-9{left:75%}.col-xs-push-8{left:66.66666667%}.col-xs-push-7{left:58.33333333%}.col-xs-push-6{left:50%}.col-xs-push-5{left:41.66666667%}.col-xs-push-4{left:33.33333333%}.col-xs-push-3{left:25%}.col-xs-push-2{left:16.66666667%}.col-xs-push-1{left:8.33333333%}.col-xs-push-0{left:auto}.col-xs-offset-12{margin-left:100%}.col-xs-offset-11{margin-left:91.66666667%}.col-xs-offset-10{margin-left:83.33333333%}.col-xs-offset-9{margin-left:75%}.col-xs-offset-8{margin-left:66.66666667%}.col-xs-offset-7{margin-left:58.33333333%}.col-xs-offset-6{margin-left:50%}.col-xs-offset-5{margin-left:41.66666667%}.col-xs-offset-4{margin-left:33.33333333%}.col-xs-offset-3{margin-left:25%}.col-xs-offset-2{margin-left:16.66666667%}.col-xs-offset-1{margin-left:8.33333333%}.col-xs-offset-0{margin-left:0%}@media (min-width:768px){.col-sm-1,.col-sm-2,.col-sm-3,.col-sm-4,.col-sm-5,.col-sm-6,.col-sm-7,.col-sm-8,.col-sm-9,.col-sm-10,.col-sm-11,.col-sm-12{float:left}.col-sm-12{width:100%}.col-sm-11{width:91.66666667%}.col-sm-10{width:83.33333333%}.col-sm-9{width:75%}.col-sm-8{width:66.66666667%}.col-sm-7{width:58.33333333%}.col-sm-6{width:50%}.col-sm-5{width:41.66666667%}.col-sm-4{width:33.33333333%}.col-sm-3{width:25%}.col-sm-2{width:16.66666667%}.col-sm-1{width:8.33333333%}.col-sm-pull-12{right:100%}.col-sm-pull-11{right:91.66666667%}.col-sm-pull-10{right:83.33333333%}.col-sm-pull-9{right:75%}.col-sm-pull-8{right:66.66666667%}.col-sm-pull-7{right:58.33333333%}.col-sm-pull-6{right:50%}.col-sm-pull-5{right:41.66666667%}.col-sm-pull-4{right:33.33333333%}.col-sm-pull-3{right:25%}.col-sm-pull-2{right:16.66666667%}.col-sm-pull-1{right:8.33333333%}.col-sm-pull-0{right:auto}.col-sm-push-12{left:100%}.col-sm-push-11{left:91.66666667%}.col-sm-push-10{left:83.33333333%}.col-sm-push-9{left:75%}.col-sm-push-8{left:66.66666667%}.col-sm-push-7{left:58.33333333%}.col-sm-push-6{left:50%}.col-sm-push-5{left:41.66666667%}.col-sm-push-4{left:33.33333333%}.col-sm-push-3{left:25%}.col-sm-push-2{left:16.66666667%}.col-sm-push-1{left:8.33333333%}.col-sm-push-0{left:auto}.col-sm-offset-12{margin-left:100%}.col-sm-offset-11{margin-left:91.66666667%}.col-sm-offset-10{margin-left:83.33333333%}.col-sm-offset-9{margin-left:75%}.col-sm-offset-8{margin-left:66.66666667%}.col-sm-offset-7{margin-left:58.33333333%}.col-sm-offset-6{margin-left:50%}.col-sm-offset-5{margin-left:41.66666667%}.col-sm-offset-4{margin-left:33.33333333%}.col-sm-offset-3{margin-left:25%}.col-sm-offset-2{margin-left:16.66666667%}.col-sm-offset-1{margin-left:8.33333333%}.col-sm-offset-0{margin-left:0%}}@media (min-width:992px){.col-md-1,.col-md-2,.col-md-3,.col-md-4,.col-md-5,.col-md-6,.col-md-7,.col-md-8,.col-md-9,.col-md-10,.col-md-11,.col-md-12{float:left}.col-md-12{width:100%}.col-md-11{width:91.66666667%}.col-md-10{width:83.33333333%}.col-md-9{width:75%}.col-md-8{width:66.66666667%}.col-md-7{width:58.33333333%}.col-md-6{width:50%}.col-md-5{width:41.66666667%}.col-md-4{width:33.33333333%}.col-md-3{width:25%}.col-md-2{width:16.66666667%}.col-md-1{width:8.33333333%}.col-md-pull-12{right:100%}.col-md-pull-11{right:91.66666667%}.col-md-pull-10{right:83.33333333%}.col-md-pull-9{right:75%}.col-md-pull-8{right:66.66666667%}.col-md-pull-7{right:58.33333333%}.col-md-pull-6{right:50%}.col-md-pull-5{right:41.66666667%}.col-md-pull-4{right:33.33333333%}.col-md-pull-3{right:25%}.col-md-pull-2{right:16.66666667%}.col-md-pull-1{right:8.33333333%}.col-md-pull-0{right:auto}.col-md-push-12{left:100%}.col-md-push-11{left:91.66666667%}.col-md-push-10{left:83.33333333%}.col-md-push-9{left:75%}.col-md-push-8{left:66.66666667%}.col-md-push-7{left:58.33333333%}.col-md-push-6{left:50%}.col-md-push-5{left:41.66666667%}.col-md-push-4{left:33.33333333%}.col-md-push-3{left:25%}.col-md-push-2{left:16.66666667%}.col-md-push-1{left:8.33333333%}.col-md-push-0{left:auto}.col-md-offset-12{margin-left:100%}.col-md-offset-11{margin-left:91.66666667%}.col-md-offset-10{margin-left:83.33333333%}.col-md-offset-9{margin-left:75%}.col-md-offset-8{margin-left:66.66666667%}.col-md-offset-7{margin-left:58.33333333%}.col-md-offset-6{margin-left:50%}.col-md-offset-5{margin-left:41.66666667%}.col-md-offset-4{margin-left:33.33333333%}.col-md-offset-3{margin-left:25%}.col-md-offset-2{margin-left:16.66666667%}.col-md-offset-1{margin-left:8.33333333%}.col-md-offset-0{margin-left:0%}}@media (min-width:1200px){.col-lg-1,.col-lg-2,.col-lg-3,.col-lg-4,.col-lg-5,.col-lg-6,.col-lg-7,.col-lg-8,.col-lg-9,.col-lg-10,.col-lg-11,.col-lg-12{float:left}.col-lg-12{width:100%}.col-lg-11{width:91.66666667%}.col-lg-10{width:83.33333333%}.col-lg-9{width:75%}.col-lg-8{width:66.66666667%}.col-lg-7{width:58.33333333%}.col-lg-6{width:50%}.col-lg-5{width:41.66666667%}.col-lg-4{width:33.33333333%}.col-lg-3{width:25%}.col-lg-2{width:16.66666667%}.col-lg-1{width:8.33333333%}.col-lg-pull-12{right:100%}.col-lg-pull-11{right:91.66666667%}.col-lg-pull-10{right:83.33333333%}.col-lg-pull-9{right:75%}.col-lg-pull-8{right:66.66666667%}.col-lg-pull-7{right:58.33333333%}.col-lg-pull-6{right:50%}.col-lg-pull-5{right:41.66666667%}.col-lg-pull-4{right:33.33333333%}.col-lg-pull-3{right:25%}.col-lg-pull-2{right:16.66666667%}.col-lg-pull-1{right:8.33333333%}.col-lg-pull-0{right:auto}.col-lg-push-12{left:100%}.col-lg-push-11{left:91.66666667%}.col-lg-push-10{left:83.33333333%}.col-lg-push-9{left:75%}.col-lg-push-8{left:66.66666667%}.col-lg-push-7{left:58.33333333%}.col-lg-push-6{left:50%}.col-lg-push-5{left:41.66666667%}.col-lg-push-4{left:33.33333333%}.col-lg-push-3{left:25%}.col-lg-push-2{left:16.66666667%}.col-lg-push-1{left:8.33333333%}.col-lg-push-0{left:auto}.col-lg-offset-12{margin-left:100%}.col-lg-offset-11{margin-left:91.66666667%}.col-lg-offset-10{margin-left:83.33333333%}.col-lg-offset-9{margin-left:75%}.col-lg-offset-8{margin-left:66.66666667%}.col-lg-offset-7{margin-left:58.33333333%}.col-lg-offset-6{margin-left:50%}.col-lg-offset-5{margin-left:41.66666667%}.col-lg-offset-4{margin-left:33.33333333%}.col-lg-offset-3{margin-left:25%}.col-lg-offset-2{margin-left:16.66666667%}.col-lg-offset-1{margin-left:8.33333333%}.col-lg-offset-0{margin-left:0%}}table{background-color:transparent}caption{padding-top:8px;padding-bottom:8px;color:#999999;text-align:left}th{}.table{width:100%;max-width:100%;margin-bottom:21px}.table>thead>tr>th,.table>tbody>tr>th,.table>tfoot>tr>th,.table>thead>tr>td,.table>tbody>tr>td,.table>tfoot>tr>td{padding:8px;line-height:1.42857143;vertical-align:top;border-top:1px solid #dddddd}.table>thead>tr>th{vertical-align:bottom;border-bottom:2px solid #dddddd}.table>caption+thead>tr:first-child>th,.table>colgroup+thead>tr:first-child>th,.table>thead:first-child>tr:first-child>th,.table>caption+thead>tr:first-child>td,.table>colgroup+thead>tr:first-child>td,.table>thead:first-child>tr:first-child>td{border-top:0}.table>tbody+tbody{border-top:2px solid #dddddd}.table .table{background-color:#ffffff}.table-condensed>thead>tr>th,.table-condensed>tbody>tr>th,.table-condensed>tfoot>tr>th,.table-condensed>thead>tr>td,.table-condensed>tbody>tr>td,.table-condensed>tfoot>tr>td{padding:5px}.table-bordered{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>tbody>tr>th,.table-bordered>tfoot>tr>th,.table-bordered>thead>tr>td,.table-bordered>tbody>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>thead>tr>td{border-bottom-width:2px}.table-striped>tbody>tr:nth-child(odd){background-color:#f9f9f9}.table-hover>tbody>tr:hover{background-color:#f5f5f5}table col[class*="col-"]{position:static;float:none;display:table-column}table td[class*="col-"],table th[class*="col-"]{position:static;float:none;display:table-cell}.table>thead>tr>td.active,.table>tbody>tr>td.active,.table>tfoot>tr>td.active,.table>thead>tr>th.active,.table>tbody>tr>th.active,.table>tfoot>tr>th.active,.table>thead>tr.active>td,.table>tbody>tr.active>td,.table>tfoot>tr.active>td,.table>thead>tr.active>th,.table>tbody>tr.active>th,.table>tfoot>tr.active>th{background-color:#f5f5f5}.table-hover>tbody>tr>td.active:hover,.table-hover>tbody>tr>th.active:hover,.table-hover>tbody>tr.active:hover>td,.table-hover>tbody>tr:hover>.active,.table-hover>tbody>tr.active:hover>th{background-color:#e8e8e8}.table>thead>tr>td.success,.table>tbody>tr>td.success,.table>tfoot>tr>td.success,.table>thead>tr>th.success,.table>tbody>tr>th.success,.table>tfoot>tr>th.success,.table>thead>tr.success>td,.table>tbody>tr.success>td,.table>tfoot>tr.success>td,.table>thead>tr.success>th,.table>tbody>tr.success>th,.table>tfoot>tr.success>th{background-color:#dff0d8}.table-hover>tbody>tr>td.success:hover,.table-hover>tbody>tr>th.success:hover,.table-hover>tbody>tr.success:hover>td,.table-hover>tbody>tr:hover>.success,.table-hover>tbody>tr.success:hover>th{background-color:#d0e9c6}.table>thead>tr>td.info,.table>tbody>tr>td.info,.table>tfoot>tr>td.info,.table>thead>tr>th.info,.table>tbody>tr>th.info,.table>tfoot>tr>th.info,.table>thead>tr.info>td,.table>tbody>tr.info>td,.table>tfoot>tr.info>td,.table>thead>tr.info>th,.table>tbody>tr.info>th,.table>tfoot>tr.info>th{background-color:#d9edf7}.table-hover>tbody>tr>td.info:hover,.table-hover>tbody>tr>th.info:hover,.table-hover>tbody>tr.info:hover>td,.table-hover>tbody>tr:hover>.info,.table-hover>tbody>tr.info:hover>th{background-color:#c4e3f3}.table>thead>tr>td.warning,.table>tbody>tr>td.warning,.table>tfoot>tr>td.warning,.table>thead>tr>th.warning,.table>tbody>tr>th.warning,.table>tfoot>tr>th.warning,.table>thead>tr.warning>td,.table>tbody>tr.warning>td,.table>tfoot>tr.warning>td,.table>thead>tr.warning>th,.table>tbody>tr.warning>th,.table>tfoot>tr.warning>th{background-color:#fcf8e3}.table-hover>tbody>tr>td.warning:hover,.table-hover>tbody>tr>th.warning:hover,.table-hover>tbody>tr.warning:hover>td,.table-hover>tbody>tr:hover>.warning,.table-hover>tbody>tr.warning:hover>th{background-color:#faf2cc}.table>thead>tr>td.danger,.table>tbody>tr>td.danger,.table>tfoot>tr>td.danger,.table>thead>tr>th.danger,.table>tbody>tr>th.danger,.table>tfoot>tr>th.danger,.table>thead>tr.danger>td,.table>tbody>tr.danger>td,.table>tfoot>tr.danger>td,.table>thead>tr.danger>th,.table>tbody>tr.danger>th,.table>tfoot>tr.danger>th{background-color:#f2dede}.table-hover>tbody>tr>td.danger:hover,.table-hover>tbody>tr>th.danger:hover,.table-hover>tbody>tr.danger:hover>td,.table-hover>tbody>tr:hover>.danger,.table-hover>tbody>tr.danger:hover>th{background-color:#ebcccc}.table-responsive{overflow-x:auto;min-height:0.01%}@media screen and (max-width:767px){.table-responsive{width:100%;margin-bottom:15.75px;overflow-y:hidden;-ms-overflow-style:-ms-autohiding-scrollbar;border:1px solid #dddddd}.table-responsive>.table{margin-bottom:0}.table-responsive>.table>thead>tr>th,.table-responsive>.table>tbody>tr>th,.table-responsive>.table>tfoot>tr>th,.table-responsive>.table>thead>tr>td,.table-responsive>.table>tbody>tr>td,.table-responsive>.table>tfoot>tr>td{white-space:nowrap}.table-responsive>.table-bordered{border:0}.table-responsive>.table-bordered>thead>tr>th:first-child,.table-responsive>.table-bordered>tbody>tr>th:first-child,.table-responsive>.table-bordered>tfoot>tr>th:first-child,.table-responsive>.table-bordered>thead>tr>td:first-child,.table-responsive>.table-bordered>tbody>tr>td:first-child,.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.table-responsive>.table-bordered>thead>tr>th:last-child,.table-responsive>.table-bordered>tbody>tr>th:last-child,.table-responsive>.table-bordered>tfoot>tr>th:last-child,.table-responsive>.table-bordered>thead>tr>td:last-child,.table-responsive>.table-bordered>tbody>tr>td:last-child,.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.table-responsive>.table-bordered>tbody>tr:last-child>th,.table-responsive>.table-bordered>tfoot>tr:last-child>th,.table-responsive>.table-bordered>tbody>tr:last-child>td,.table-responsive>.table-bordered>tfoot>tr:last-child>td{border-bottom:0}}fieldset{padding:0;margin:0;border:0;min-width:0}legend{display:block;width:100%;padding:0;margin-bottom:21px;font-size:22.5px;line-height:inherit;color:#777777;border:0;border-bottom:1px solid #e5e5e5}label{display:inline-block;max-width:100%;margin-bottom:5px;font-weight:bold}input[type="search"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}input[type="radio"],input[type="checkbox"]{margin:4px 0 0;margin-top:1px \9;line-height:normal}input[type="file"]{display:block}input[type="range"]{display:block;width:100%}select[multiple],select[size]{height:auto}input[type="file"]:focus,input[type="radio"]:focus,input[type="checkbox"]:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}output{display:block;padding-top:9px;font-size:15px;line-height:1.42857143;color:#777777}.form-control{display:block;width:100%;height:39px;padding:8px 12px;font-size:15px;line-height:1.42857143;color:#777777;background-color:#ffffff;background-image:none;border:1px solid #cccccc;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);-webkit-transition:border-color ease-in-out .15s,-webkit-box-shadow ease-in-out .15s;-o-transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s;transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s}.form-control:focus{border-color:#66afe9;outline:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6)}.form-control::-moz-placeholder{color:#999999;opacity:1}.form-control:-ms-input-placeholder{color:#999999}.form-control::-webkit-input-placeholder{color:#999999}.form-control[disabled],.form-control[readonly],fieldset[disabled] .form-control{cursor:not-allowed;background-color:#eeeeee;opacity:1}textarea.form-control{height:auto}input[type="search"]{-webkit-appearance:none}@media screen and (-webkit-min-device-pixel-ratio:0){input[type="date"],input[type="time"],input[type="datetime-local"],input[type="month"]{line-height:39px}input[type="date"].input-sm,input[type="time"].input-sm,input[type="datetime-local"].input-sm,input[type="month"].input-sm{line-height:31px}input[type="date"].input-lg,input[type="time"].input-lg,input[type="datetime-local"].input-lg,input[type="month"].input-lg{line-height:56px}}.form-group{margin-bottom:15px}.radio,.checkbox{position:relative;display:block;margin-top:10px;margin-bottom:10px}.radio label,.checkbox label{min-height:21px;padding-left:20px;margin-bottom:0;font-weight:normal;cursor:pointer}.radio input[type="radio"],.radio-inline input[type="radio"],.checkbox input[type="checkbox"],.checkbox-inline input[type="checkbox"]{position:absolute;margin-left:-20px;margin-top:4px \9}.radio+.radio,.checkbox+.checkbox{margin-top:-5px}.radio-inline,.checkbox-inline{display:inline-block;padding-left:20px;margin-bottom:0;vertical-align:middle;font-weight:normal;cursor:pointer}.radio-inline+.radio-inline,.checkbox-inline+.checkbox-inline{margin-top:0;margin-left:10px}input[type="radio"][disabled],input[type="checkbox"][disabled],input[type="radio"].disabled,input[type="checkbox"].disabled,fieldset[disabled] input[type="radio"],fieldset[disabled] input[type="checkbox"]{cursor:not-allowed}.radio-inline.disabled,.checkbox-inline.disabled,fieldset[disabled] .radio-inline,fieldset[disabled] .checkbox-inline{cursor:not-allowed}.radio.disabled label,.checkbox.disabled label,fieldset[disabled] .radio label,fieldset[disabled] .checkbox label{cursor:not-allowed}.form-control-static{padding-top:9px;padding-bottom:9px;margin-bottom:0}.form-control-static.input-lg,.form-control-static.input-sm{padding-left:0;padding-right:0}.input-sm,.form-group-sm .form-control{height:31px;padding:5px 10px;font-size:13px;line-height:1.5;border-radius:3px}select.input-sm,select.form-group-sm .form-control{height:31px;line-height:31px}textarea.input-sm,textarea.form-group-sm .form-control,select[multiple].input-sm,select[multiple].form-group-sm .form-control{height:auto}.input-lg,.form-group-lg .form-control{height:56px;padding:14px 16px;font-size:19px;line-height:1.33;border-radius:6px}select.input-lg,select.form-group-lg .form-control{height:56px;line-height:56px}textarea.input-lg,textarea.form-group-lg .form-control,select[multiple].input-lg,select[multiple].form-group-lg .form-control{height:auto}.has-feedback{position:relative}.has-feedback .form-control{padding-right:48.75px}.form-control-feedback{position:absolute;top:0;right:0;z-index:2;display:block;width:39px;height:39px;line-height:39px;text-align:center;pointer-events:none}.input-lg+.form-control-feedback{width:56px;height:56px;line-height:56px}.input-sm+.form-control-feedback{width:31px;height:31px;line-height:31px}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success.radio label,.has-success.checkbox label,.has-success.radio-inline label,.has-success.checkbox-inline label{color:#468847}.has-success .form-control{border-color:#468847;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-success .form-control:focus{border-color:#356635;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #7aba7b;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #7aba7b}.has-success .input-group-addon{color:#468847;border-color:#468847;background-color:#dff0d8}.has-success .form-control-feedback{color:#468847}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning.radio label,.has-warning.checkbox label,.has-warning.radio-inline label,.has-warning.checkbox-inline label{color:#c09853}.has-warning .form-control{border-color:#c09853;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-warning .form-control:focus{border-color:#a47e3c;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #dbc59e;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #dbc59e}.has-warning .input-group-addon{color:#c09853;border-color:#c09853;background-color:#fcf8e3}.has-warning .form-control-feedback{color:#c09853}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error.radio label,.has-error.checkbox label,.has-error.radio-inline label,.has-error.checkbox-inline label{color:#b94a48}.has-error .form-control{border-color:#b94a48;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-error .form-control:focus{border-color:#953b39;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #d59392;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #d59392}.has-error .input-group-addon{color:#b94a48;border-color:#b94a48;background-color:#f2dede}.has-error .form-control-feedback{color:#b94a48}.has-feedback label~.form-control-feedback{top:26px}.has-feedback label.sr-only~.form-control-feedback{top:0}.help-block{display:block;margin-top:5px;margin-bottom:10px;color:#b7b7b7}@media (min-width:768px){.form-inline .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.form-inline .form-control{display:inline-block;width:auto;vertical-align:middle}.form-inline .form-control-static{display:inline-block}.form-inline .input-group{display:inline-table;vertical-align:middle}.form-inline .input-group .input-group-addon,.form-inline .input-group .input-group-btn,.form-inline .input-group .form-control{width:auto}.form-inline .input-group>.form-control{width:100%}.form-inline .control-label{margin-bottom:0;vertical-align:middle}.form-inline .radio,.form-inline .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.form-inline .radio label,.form-inline .checkbox label{padding-left:0}.form-inline .radio input[type="radio"],.form-inline .checkbox input[type="checkbox"]{position:relative;margin-left:0}.form-inline .has-feedback .form-control-feedback{top:0}}.form-horizontal .radio,.form-horizontal .checkbox,.form-horizontal .radio-inline,.form-horizontal .checkbox-inline{margin-top:0;margin-bottom:0;padding-top:9px}.form-horizontal .radio,.form-horizontal .checkbox{min-height:30px}.form-horizontal .form-group{margin-left:-15px;margin-right:-15px}@media (min-width:768px){.form-horizontal .control-label{text-align:right;margin-bottom:0;padding-top:9px}}.form-horizontal .has-feedback .form-control-feedback{right:15px}@media (min-width:768px){.form-horizontal .form-group-lg .control-label{padding-top:19.62px}}@media (min-width:768px){.form-horizontal .form-group-sm .control-label{padding-top:6px}}.btn{display:inline-block;margin-bottom:0;font-weight:normal;text-align:center;vertical-align:middle;-ms-touch-action:manipulation;touch-action:manipulation;cursor:pointer;background-image:none;border:1px solid transparent;white-space:nowrap;padding:8px 12px;font-size:15px;line-height:1.42857143;border-radius:4px;-webkit-user-select:none;-moz-user-select:none;-ms-user-select:none;user-select:none}.btn:focus,.btn:active:focus,.btn.active:focus,.btn.focus,.btn:active.focus,.btn.active.focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}.btn:hover,.btn:focus,.btn.focus{color:#ffffff;text-decoration:none}.btn:active,.btn.active{outline:0;background-image:none;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn.disabled,.btn[disabled],fieldset[disabled] .btn{cursor:not-allowed;pointer-events:none;opacity:0.65;filter:alpha(opacity=65);-webkit-box-shadow:none;box-shadow:none}.btn-default{color:#ffffff;background-color:#999999;border-color:#999999}.btn-default:hover,.btn-default:focus,.btn-default.focus,.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{color:#ffffff;background-color:#808080;border-color:#7a7a7a}.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{background-image:none}.btn-default.disabled,.btn-default[disabled],fieldset[disabled] .btn-default,.btn-default.disabled:hover,.btn-default[disabled]:hover,fieldset[disabled] .btn-default:hover,.btn-default.disabled:focus,.btn-default[disabled]:focus,fieldset[disabled] .btn-default:focus,.btn-default.disabled.focus,.btn-default[disabled].focus,fieldset[disabled] .btn-default.focus,.btn-default.disabled:active,.btn-default[disabled]:active,fieldset[disabled] .btn-default:active,.btn-default.disabled.active,.btn-default[disabled].active,fieldset[disabled] .btn-default.active{background-color:#999999;border-color:#999999}.btn-default .badge{color:#999999;background-color:#ffffff}.btn-primary{color:#ffffff;background-color:#eb6864;border-color:#eb6864}.btn-primary:hover,.btn-primary:focus,.btn-primary.focus,.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{color:#ffffff;background-color:#e53c37;border-color:#e4332e}.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{background-image:none}.btn-primary.disabled,.btn-primary[disabled],fieldset[disabled] .btn-primary,.btn-primary.disabled:hover,.btn-primary[disabled]:hover,fieldset[disabled] .btn-primary:hover,.btn-primary.disabled:focus,.btn-primary[disabled]:focus,fieldset[disabled] .btn-primary:focus,.btn-primary.disabled.focus,.btn-primary[disabled].focus,fieldset[disabled] .btn-primary.focus,.btn-primary.disabled:active,.btn-primary[disabled]:active,fieldset[disabled] .btn-primary:active,.btn-primary.disabled.active,.btn-primary[disabled].active,fieldset[disabled] .btn-primary.active{background-color:#eb6864;border-color:#eb6864}.btn-primary .badge{color:#eb6864;background-color:#ffffff}.btn-success{color:#ffffff;background-color:#22b24c;border-color:#22b24c}.btn-success:hover,.btn-success:focus,.btn-success.focus,.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{color:#ffffff;background-color:#1a873a;border-color:#187f36}.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{background-image:none}.btn-success.disabled,.btn-success[disabled],fieldset[disabled] .btn-success,.btn-success.disabled:hover,.btn-success[disabled]:hover,fieldset[disabled] .btn-success:hover,.btn-success.disabled:focus,.btn-success[disabled]:focus,fieldset[disabled] .btn-success:focus,.btn-success.disabled.focus,.btn-success[disabled].focus,fieldset[disabled] .btn-success.focus,.btn-success.disabled:active,.btn-success[disabled]:active,fieldset[disabled] .btn-success:active,.btn-success.disabled.active,.btn-success[disabled].active,fieldset[disabled] .btn-success.active{background-color:#22b24c;border-color:#22b24c}.btn-success .badge{color:#22b24c;background-color:#ffffff}.btn-info{color:#ffffff;background-color:#336699;border-color:#336699}.btn-info:hover,.btn-info:focus,.btn-info.focus,.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{color:#ffffff;background-color:#264c73;border-color:#24476b}.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{background-image:none}.btn-info.disabled,.btn-info[disabled],fieldset[disabled] .btn-info,.btn-info.disabled:hover,.btn-info[disabled]:hover,fieldset[disabled] .btn-info:hover,.btn-info.disabled:focus,.btn-info[disabled]:focus,fieldset[disabled] .btn-info:focus,.btn-info.disabled.focus,.btn-info[disabled].focus,fieldset[disabled] .btn-info.focus,.btn-info.disabled:active,.btn-info[disabled]:active,fieldset[disabled] .btn-info:active,.btn-info.disabled.active,.btn-info[disabled].active,fieldset[disabled] .btn-info.active{background-color:#336699;border-color:#336699}.btn-info .badge{color:#336699;background-color:#ffffff}.btn-warning{color:#ffffff;background-color:#f5e625;border-color:#f5e625}.btn-warning:hover,.btn-warning:focus,.btn-warning.focus,.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{color:#ffffff;background-color:#ddce0a;border-color:#d3c50a}.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{background-image:none}.btn-warning.disabled,.btn-warning[disabled],fieldset[disabled] .btn-warning,.btn-warning.disabled:hover,.btn-warning[disabled]:hover,fieldset[disabled] .btn-warning:hover,.btn-warning.disabled:focus,.btn-warning[disabled]:focus,fieldset[disabled] .btn-warning:focus,.btn-warning.disabled.focus,.btn-warning[disabled].focus,fieldset[disabled] .btn-warning.focus,.btn-warning.disabled:active,.btn-warning[disabled]:active,fieldset[disabled] .btn-warning:active,.btn-warning.disabled.active,.btn-warning[disabled].active,fieldset[disabled] .btn-warning.active{background-color:#f5e625;border-color:#f5e625}.btn-warning .badge{color:#f5e625;background-color:#ffffff}.btn-danger{color:#ffffff;background-color:#f57a00;border-color:#f57a00}.btn-danger:hover,.btn-danger:focus,.btn-danger.focus,.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{color:#ffffff;background-color:#c26100;border-color:#b85c00}.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{background-image:none}.btn-danger.disabled,.btn-danger[disabled],fieldset[disabled] .btn-danger,.btn-danger.disabled:hover,.btn-danger[disabled]:hover,fieldset[disabled] .btn-danger:hover,.btn-danger.disabled:focus,.btn-danger[disabled]:focus,fieldset[disabled] .btn-danger:focus,.btn-danger.disabled.focus,.btn-danger[disabled].focus,fieldset[disabled] .btn-danger.focus,.btn-danger.disabled:active,.btn-danger[disabled]:active,fieldset[disabled] .btn-danger:active,.btn-danger.disabled.active,.btn-danger[disabled].active,fieldset[disabled] .btn-danger.active{background-color:#f57a00;border-color:#f57a00}.btn-danger .badge{color:#f57a00;background-color:#ffffff}.btn-link{color:#eb6864;font-weight:normal;border-radius:0}.btn-link,.btn-link:active,.btn-link.active,.btn-link[disabled],fieldset[disabled] .btn-link{background-color:transparent;-webkit-box-shadow:none;box-shadow:none}.btn-link,.btn-link:hover,.btn-link:focus,.btn-link:active{border-color:transparent}.btn-link:hover,.btn-link:focus{color:#e22620;text-decoration:underline;background-color:transparent}.btn-link[disabled]:hover,fieldset[disabled] .btn-link:hover,.btn-link[disabled]:focus,fieldset[disabled] .btn-link:focus{color:#999999;text-decoration:none}.btn-lg,.btn-group-lg>.btn{padding:14px 16px;font-size:19px;line-height:1.33;border-radius:6px}.btn-sm,.btn-group-sm>.btn{padding:5px 10px;font-size:13px;line-height:1.5;border-radius:3px}.btn-xs,.btn-group-xs>.btn{padding:1px 5px;font-size:13px;line-height:1.5;border-radius:3px}.btn-block{display:block;width:100%}.btn-block+.btn-block{margin-top:5px}input[type="submit"].btn-block,input[type="reset"].btn-block,input[type="button"].btn-block{width:100%}.fade{opacity:0;-webkit-transition:opacity 0.15s linear;-o-transition:opacity 0.15s linear;transition:opacity 0.15s linear}.fade.in{opacity:1}.collapse{display:none;visibility:hidden}.collapse.in{display:block;visibility:visible}tr.collapse.in{display:table-row}tbody.collapse.in{display:table-row-group}.collapsing{position:relative;height:0;overflow:hidden;-webkit-transition-property:height, visibility;-o-transition-property:height, visibility;transition-property:height, visibility;-webkit-transition-duration:0.35s;-o-transition-duration:0.35s;transition-duration:0.35s;-webkit-transition-timing-function:ease;-o-transition-timing-function:ease;transition-timing-function:ease}.caret{display:inline-block;width:0;height:0;margin-left:2px;vertical-align:middle;border-top:4px solid;border-right:4px solid transparent;border-left:4px solid transparent}.dropdown{position:relative}.dropdown-toggle:focus{outline:0}.dropdown-menu{position:absolute;top:100%;left:0;z-index:1000;display:none;float:left;min-width:160px;padding:5px 0;margin:2px 0 0;list-style:none;font-size:15px;text-align:left;background-color:#ffffff;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.15);border-radius:4px;-webkit-box-shadow:0 6px 12px rgba(0,0,0,0.175);box-shadow:0 6px 12px rgba(0,0,0,0.175);-webkit-background-clip:padding-box;background-clip:padding-box}.dropdown-menu.pull-right{right:0;left:auto}.dropdown-menu .divider{height:1px;margin:9.5px 0;overflow:hidden;background-color:#e5e5e5}.dropdown-menu>li>a{display:block;padding:3px 20px;clear:both;font-weight:normal;line-height:1.42857143;color:#333333;white-space:nowrap}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{text-decoration:none;color:#ffffff;background-color:#eb6864}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{color:#ffffff;text-decoration:none;outline:0;background-color:#eb6864}.dropdown-menu>.disabled>a,.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{color:#999999}.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{text-decoration:none;background-color:transparent;background-image:none;filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);cursor:not-allowed}.open>.dropdown-menu{display:block}.open>a{outline:0}.dropdown-menu-right{left:auto;right:0}.dropdown-menu-left{left:0;right:auto}.dropdown-header{display:block;padding:3px 20px;font-size:13px;line-height:1.42857143;color:#999999;white-space:nowrap}.dropdown-backdrop{position:fixed;left:0;right:0;bottom:0;top:0;z-index:990}.pull-right>.dropdown-menu{right:0;left:auto}.dropup .caret,.navbar-fixed-bottom .dropdown .caret{border-top:0;border-bottom:4px solid;content:""}.dropup .dropdown-menu,.navbar-fixed-bottom .dropdown .dropdown-menu{top:auto;bottom:100%;margin-bottom:1px}@media (min-width:768px){.navbar-right .dropdown-menu{left:auto;right:0}.navbar-right .dropdown-menu-left{left:0;right:auto}}.btn-group,.btn-group-vertical{position:relative;display:inline-block;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;float:left}.btn-group>.btn:hover,.btn-group-vertical>.btn:hover,.btn-group>.btn:focus,.btn-group-vertical>.btn:focus,.btn-group>.btn:active,.btn-group-vertical>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn.active{z-index:2}.btn-group .btn+.btn,.btn-group .btn+.btn-group,.btn-group .btn-group+.btn,.btn-group .btn-group+.btn-group{margin-left:-1px}.btn-toolbar{margin-left:-5px}.btn-toolbar .btn-group,.btn-toolbar .input-group{float:left}.btn-toolbar>.btn,.btn-toolbar>.btn-group,.btn-toolbar>.input-group{margin-left:5px}.btn-group>.btn:not(:first-child):not(:last-child):not(.dropdown-toggle){border-radius:0}.btn-group>.btn:first-child{margin-left:0}.btn-group>.btn:first-child:not(:last-child):not(.dropdown-toggle){border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn:last-child:not(:first-child),.btn-group>.dropdown-toggle:not(:first-child){border-bottom-left-radius:0;border-top-left-radius:0}.btn-group>.btn-group{float:left}.btn-group>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group>.btn-group:first-child>.btn:last-child,.btn-group>.btn-group:first-child>.dropdown-toggle{border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn-group:last-child>.btn:first-child{border-bottom-left-radius:0;border-top-left-radius:0}.btn-group .dropdown-toggle:active,.btn-group.open .dropdown-toggle{outline:0}.btn-group>.btn+.dropdown-toggle{padding-left:8px;padding-right:8px}.btn-group>.btn-lg+.dropdown-toggle{padding-left:12px;padding-right:12px}.btn-group.open .dropdown-toggle{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn-group.open .dropdown-toggle.btn-link{-webkit-box-shadow:none;box-shadow:none}.btn .caret{margin-left:0}.btn-lg .caret{border-width:5px 5px 0;border-bottom-width:0}.dropup .btn-lg .caret{border-width:0 5px 5px}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group,.btn-group-vertical>.btn-group>.btn{display:block;float:none;width:100%;max-width:100%}.btn-group-vertical>.btn-group>.btn{float:none}.btn-group-vertical>.btn+.btn,.btn-group-vertical>.btn+.btn-group,.btn-group-vertical>.btn-group+.btn,.btn-group-vertical>.btn-group+.btn-group{margin-top:-1px;margin-left:0}.btn-group-vertical>.btn:not(:first-child):not(:last-child){border-radius:0}.btn-group-vertical>.btn:first-child:not(:last-child){border-top-right-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn:last-child:not(:first-child){border-bottom-left-radius:4px;border-top-right-radius:0;border-top-left-radius:0}.btn-group-vertical>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group-vertical>.btn-group:first-child:not(:last-child)>.btn:last-child,.btn-group-vertical>.btn-group:first-child:not(:last-child)>.dropdown-toggle{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn-group:last-child:not(:first-child)>.btn:first-child{border-top-right-radius:0;border-top-left-radius:0}.btn-group-justified{display:table;width:100%;table-layout:fixed;border-collapse:separate}.btn-group-justified>.btn,.btn-group-justified>.btn-group{float:none;display:table-cell;width:1%}.btn-group-justified>.btn-group .btn{width:100%}.btn-group-justified>.btn-group .dropdown-menu{left:auto}[data-toggle="buttons"]>.btn input[type="radio"],[data-toggle="buttons"]>.btn-group>.btn input[type="radio"],[data-toggle="buttons"]>.btn input[type="checkbox"],[data-toggle="buttons"]>.btn-group>.btn input[type="checkbox"]{position:absolute;clip:rect(0, 0, 0, 0);pointer-events:none}.input-group{position:relative;display:table;border-collapse:separate}.input-group[class*="col-"]{float:none;padding-left:0;padding-right:0}.input-group .form-control{position:relative;z-index:2;float:left;width:100%;margin-bottom:0}.input-group-lg>.form-control,.input-group-lg>.input-group-addon,.input-group-lg>.input-group-btn>.btn{height:56px;padding:14px 16px;font-size:19px;line-height:1.33;border-radius:6px}select.input-group-lg>.form-control,select.input-group-lg>.input-group-addon,select.input-group-lg>.input-group-btn>.btn{height:56px;line-height:56px}textarea.input-group-lg>.form-control,textarea.input-group-lg>.input-group-addon,textarea.input-group-lg>.input-group-btn>.btn,select[multiple].input-group-lg>.form-control,select[multiple].input-group-lg>.input-group-addon,select[multiple].input-group-lg>.input-group-btn>.btn{height:auto}.input-group-sm>.form-control,.input-group-sm>.input-group-addon,.input-group-sm>.input-group-btn>.btn{height:31px;padding:5px 10px;font-size:13px;line-height:1.5;border-radius:3px}select.input-group-sm>.form-control,select.input-group-sm>.input-group-addon,select.input-group-sm>.input-group-btn>.btn{height:31px;line-height:31px}textarea.input-group-sm>.form-control,textarea.input-group-sm>.input-group-addon,textarea.input-group-sm>.input-group-btn>.btn,select[multiple].input-group-sm>.form-control,select[multiple].input-group-sm>.input-group-addon,select[multiple].input-group-sm>.input-group-btn>.btn{height:auto}.input-group-addon,.input-group-btn,.input-group .form-control{display:table-cell}.input-group-addon:not(:first-child):not(:last-child),.input-group-btn:not(:first-child):not(:last-child),.input-group .form-control:not(:first-child):not(:last-child){border-radius:0}.input-group-addon,.input-group-btn{width:1%;white-space:nowrap;vertical-align:middle}.input-group-addon{padding:8px 12px;font-size:15px;font-weight:normal;line-height:1;color:#777777;text-align:center;background-color:#eeeeee;border:1px solid #cccccc;border-radius:4px}.input-group-addon.input-sm{padding:5px 10px;font-size:13px;border-radius:3px}.input-group-addon.input-lg{padding:14px 16px;font-size:19px;border-radius:6px}.input-group-addon input[type="radio"],.input-group-addon input[type="checkbox"]{margin-top:0}.input-group .form-control:first-child,.input-group-addon:first-child,.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group>.btn,.input-group-btn:first-child>.dropdown-toggle,.input-group-btn:last-child>.btn:not(:last-child):not(.dropdown-toggle),.input-group-btn:last-child>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-top-right-radius:0}.input-group-addon:first-child{border-right:0}.input-group .form-control:last-child,.input-group-addon:last-child,.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group>.btn,.input-group-btn:last-child>.dropdown-toggle,.input-group-btn:first-child>.btn:not(:first-child),.input-group-btn:first-child>.btn-group:not(:first-child)>.btn{border-bottom-left-radius:0;border-top-left-radius:0}.input-group-addon:last-child{border-left:0}.input-group-btn{position:relative;font-size:0;white-space:nowrap}.input-group-btn>.btn{position:relative}.input-group-btn>.btn+.btn{margin-left:-1px}.input-group-btn>.btn:hover,.input-group-btn>.btn:focus,.input-group-btn>.btn:active{z-index:2}.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group{margin-right:-1px}.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group{margin-left:-1px}.nav{margin-bottom:0;padding-left:0;list-style:none}.nav>li{position:relative;display:block}.nav>li>a{position:relative;display:block;padding:10px 15px}.nav>li>a:hover,.nav>li>a:focus{text-decoration:none;background-color:#eeeeee}.nav>li.disabled>a{color:#999999}.nav>li.disabled>a:hover,.nav>li.disabled>a:focus{color:#999999;text-decoration:none;background-color:transparent;cursor:not-allowed}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{background-color:#eeeeee;border-color:#eb6864}.nav .nav-divider{height:1px;margin:9.5px 0;overflow:hidden;background-color:#e5e5e5}.nav>li>a>img{max-width:none}.nav-tabs{border-bottom:1px solid #dddddd}.nav-tabs>li{float:left;margin-bottom:-1px}.nav-tabs>li>a{margin-right:2px;line-height:1.42857143;border:1px solid transparent;border-radius:4px 4px 0 0}.nav-tabs>li>a:hover{border-color:#eeeeee #eeeeee #dddddd}.nav-tabs>li.active>a,.nav-tabs>li.active>a:hover,.nav-tabs>li.active>a:focus{color:#777777;background-color:#ffffff;border:1px solid #dddddd;border-bottom-color:transparent;cursor:default}.nav-tabs.nav-justified{width:100%;border-bottom:0}.nav-tabs.nav-justified>li{float:none}.nav-tabs.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-tabs.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-tabs.nav-justified>li{display:table-cell;width:1%}.nav-tabs.nav-justified>li>a{margin-bottom:0}}.nav-tabs.nav-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs.nav-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border-bottom-color:#ffffff}}.nav-pills>li{float:left}.nav-pills>li>a{border-radius:4px}.nav-pills>li+li{margin-left:2px}.nav-pills>li.active>a,.nav-pills>li.active>a:hover,.nav-pills>li.active>a:focus{color:#ffffff;background-color:#eb6864}.nav-stacked>li{float:none}.nav-stacked>li+li{margin-top:2px;margin-left:0}.nav-justified{width:100%}.nav-justified>li{float:none}.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-justified>li{display:table-cell;width:1%}.nav-justified>li>a{margin-bottom:0}}.nav-tabs-justified{border-bottom:0}.nav-tabs-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border-bottom-color:#ffffff}}.tab-content>.tab-pane{display:none;visibility:hidden}.tab-content>.active{display:block;visibility:visible}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-right-radius:0;border-top-left-radius:0}.navbar{position:relative;min-height:60px;margin-bottom:21px;border:1px solid transparent}@media (min-width:768px){.navbar{border-radius:4px}}@media (min-width:768px){.navbar-header{float:left}}.navbar-collapse{overflow-x:visible;padding-right:15px;padding-left:15px;border-top:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);-webkit-overflow-scrolling:touch}.navbar-collapse.in{overflow-y:auto}@media (min-width:768px){.navbar-collapse{width:auto;border-top:0;-webkit-box-shadow:none;box-shadow:none}.navbar-collapse.collapse{display:block !important;visibility:visible !important;height:auto !important;padding-bottom:0;overflow:visible !important}.navbar-collapse.in{overflow-y:visible}.navbar-fixed-top .navbar-collapse,.navbar-static-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{padding-left:0;padding-right:0}}.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:340px}@media (max-device-width:480px) and (orientation:landscape){.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:200px}}.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:0;margin-left:0}}.navbar-static-top{z-index:1000;border-width:0 0 1px}@media (min-width:768px){.navbar-static-top{border-radius:0}}.navbar-fixed-top,.navbar-fixed-bottom{position:fixed;right:0;left:0;z-index:1030}@media (min-width:768px){.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}}.navbar-fixed-top{top:0;border-width:0 0 1px}.navbar-fixed-bottom{bottom:0;margin-bottom:0;border-width:1px 0 0}.navbar-brand{float:left;padding:19.5px 15px;font-size:19px;line-height:21px;height:60px}.navbar-brand:hover,.navbar-brand:focus{text-decoration:none}.navbar-brand>img{display:block}@media (min-width:768px){.navbar>.container .navbar-brand,.navbar>.container-fluid .navbar-brand{margin-left:-15px}}.navbar-toggle{position:relative;float:right;margin-right:15px;padding:9px 10px;margin-top:13px;margin-bottom:13px;background-color:transparent;background-image:none;border:1px solid transparent;border-radius:4px}.navbar-toggle:focus{outline:0}.navbar-toggle .icon-bar{display:block;width:22px;height:2px;border-radius:1px}.navbar-toggle .icon-bar+.icon-bar{margin-top:4px}@media (min-width:768px){.navbar-toggle{display:none}}.navbar-nav{margin:9.75px -15px}.navbar-nav>li>a{padding-top:10px;padding-bottom:10px;line-height:21px}@media (max-width:767px){.navbar-nav .open .dropdown-menu{position:static;float:none;width:auto;margin-top:0;background-color:transparent;border:0;-webkit-box-shadow:none;box-shadow:none}.navbar-nav .open .dropdown-menu>li>a,.navbar-nav .open .dropdown-menu .dropdown-header{padding:5px 15px 5px 25px}.navbar-nav .open .dropdown-menu>li>a{line-height:21px}.navbar-nav .open .dropdown-menu>li>a:hover,.navbar-nav .open .dropdown-menu>li>a:focus{background-image:none}}@media (min-width:768px){.navbar-nav{float:left;margin:0}.navbar-nav>li{float:left}.navbar-nav>li>a{padding-top:19.5px;padding-bottom:19.5px}}.navbar-form{margin-left:-15px;margin-right:-15px;padding:10px 15px;border-top:1px solid transparent;border-bottom:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);margin-top:10.5px;margin-bottom:10.5px}@media (min-width:768px){.navbar-form .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.navbar-form .form-control{display:inline-block;width:auto;vertical-align:middle}.navbar-form .form-control-static{display:inline-block}.navbar-form .input-group{display:inline-table;vertical-align:middle}.navbar-form .input-group .input-group-addon,.navbar-form .input-group .input-group-btn,.navbar-form .input-group .form-control{width:auto}.navbar-form .input-group>.form-control{width:100%}.navbar-form .control-label{margin-bottom:0;vertical-align:middle}.navbar-form .radio,.navbar-form .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.navbar-form .radio label,.navbar-form .checkbox label{padding-left:0}.navbar-form .radio input[type="radio"],.navbar-form .checkbox input[type="checkbox"]{position:relative;margin-left:0}.navbar-form .has-feedback .form-control-feedback{top:0}}@media (max-width:767px){.navbar-form .form-group{margin-bottom:5px}.navbar-form .form-group:last-child{margin-bottom:0}}@media (min-width:768px){.navbar-form{width:auto;border:0;margin-left:0;margin-right:0;padding-top:0;padding-bottom:0;-webkit-box-shadow:none;box-shadow:none}}.navbar-nav>li>.dropdown-menu{margin-top:0;border-top-right-radius:0;border-top-left-radius:0}.navbar-fixed-bottom .navbar-nav>li>.dropdown-menu{border-top-right-radius:4px;border-top-left-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.navbar-btn{margin-top:10.5px;margin-bottom:10.5px}.navbar-btn.btn-sm{margin-top:14.5px;margin-bottom:14.5px}.navbar-btn.btn-xs{margin-top:19px;margin-bottom:19px}.navbar-text{margin-top:19.5px;margin-bottom:19.5px}@media (min-width:768px){.navbar-text{float:left;margin-left:15px;margin-right:15px}}@media (min-width:768px){.navbar-left{float:left !important}.navbar-right{float:right !important;margin-right:-15px}.navbar-right~.navbar-right{margin-right:0}}.navbar-default{background-color:#ffffff;border-color:#eeeeee}.navbar-default .navbar-brand{color:#000000}.navbar-default .navbar-brand:hover,.navbar-default .navbar-brand:focus{color:#000000;background-color:#eeeeee}.navbar-default .navbar-text{color:#000000}.navbar-default .navbar-nav>li>a{color:#000000}.navbar-default .navbar-nav>li>a:hover,.navbar-default .navbar-nav>li>a:focus{color:#000000;background-color:#eeeeee}.navbar-default .navbar-nav>.active>a,.navbar-default .navbar-nav>.active>a:hover,.navbar-default .navbar-nav>.active>a:focus{color:#000000;background-color:#eeeeee}.navbar-default .navbar-nav>.disabled>a,.navbar-default .navbar-nav>.disabled>a:hover,.navbar-default .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-default .navbar-toggle{border-color:#dddddd}.navbar-default .navbar-toggle:hover,.navbar-default .navbar-toggle:focus{background-color:#dddddd}.navbar-default .navbar-toggle .icon-bar{background-color:#cccccc}.navbar-default .navbar-collapse,.navbar-default .navbar-form{border-color:#eeeeee}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.open>a:hover,.navbar-default .navbar-nav>.open>a:focus{background-color:#eeeeee;color:#000000}@media (max-width:767px){.navbar-default .navbar-nav .open .dropdown-menu>li>a{color:#000000}.navbar-default .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>li>a:focus{color:#000000;background-color:#eeeeee}.navbar-default .navbar-nav .open .dropdown-menu>.active>a,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:focus{color:#000000;background-color:#eeeeee}.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-default .navbar-link{color:#000000}.navbar-default .navbar-link:hover{color:#000000}.navbar-default .btn-link{color:#000000}.navbar-default .btn-link:hover,.navbar-default .btn-link:focus{color:#000000}.navbar-default .btn-link[disabled]:hover,fieldset[disabled] .navbar-default .btn-link:hover,.navbar-default .btn-link[disabled]:focus,fieldset[disabled] .navbar-default .btn-link:focus{color:#cccccc}.navbar-inverse{background-color:#eb6864;border-color:#e53c37}.navbar-inverse .navbar-brand{color:#ffffff}.navbar-inverse .navbar-brand:hover,.navbar-inverse .navbar-brand:focus{color:#ffffff;background-color:#e74b47}.navbar-inverse .navbar-text{color:#ffffff}.navbar-inverse .navbar-nav>li>a{color:#ffffff}.navbar-inverse .navbar-nav>li>a:hover,.navbar-inverse .navbar-nav>li>a:focus{color:#ffffff;background-color:#e74b47}.navbar-inverse .navbar-nav>.active>a,.navbar-inverse .navbar-nav>.active>a:hover,.navbar-inverse .navbar-nav>.active>a:focus{color:#ffffff;background-color:#e74b47}.navbar-inverse .navbar-nav>.disabled>a,.navbar-inverse .navbar-nav>.disabled>a:hover,.navbar-inverse .navbar-nav>.disabled>a:focus{color:#444444;background-color:transparent}.navbar-inverse .navbar-toggle{border-color:#e53c37}.navbar-inverse .navbar-toggle:hover,.navbar-inverse .navbar-toggle:focus{background-color:#e53c37}.navbar-inverse .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-inverse .navbar-collapse,.navbar-inverse .navbar-form{border-color:#e74944}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.open>a:hover,.navbar-inverse .navbar-nav>.open>a:focus{background-color:#e74b47;color:#ffffff}@media (max-width:767px){.navbar-inverse .navbar-nav .open .dropdown-menu>.dropdown-header{border-color:#e53c37}.navbar-inverse .navbar-nav .open .dropdown-menu .divider{background-color:#e53c37}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:focus{color:#ffffff;background-color:#e74b47}.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#e74b47}.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#444444;background-color:transparent}}.navbar-inverse .navbar-link{color:#ffffff}.navbar-inverse .navbar-link:hover{color:#ffffff}.navbar-inverse .btn-link{color:#ffffff}.navbar-inverse .btn-link:hover,.navbar-inverse .btn-link:focus{color:#ffffff}.navbar-inverse .btn-link[disabled]:hover,fieldset[disabled] .navbar-inverse .btn-link:hover,.navbar-inverse .btn-link[disabled]:focus,fieldset[disabled] .navbar-inverse .btn-link:focus{color:#444444}.breadcrumb{padding:8px 15px;margin-bottom:21px;list-style:none;background-color:#f5f5f5;border-radius:4px}.breadcrumb>li{display:inline-block}.breadcrumb>li+li:before{content:"/\00a0";padding:0 5px;color:#cccccc}.breadcrumb>.active{color:#999999}.pagination{display:inline-block;padding-left:0;margin:21px 0;border-radius:4px}.pagination>li{display:inline}.pagination>li>a,.pagination>li>span{position:relative;float:left;padding:8px 12px;line-height:1.42857143;text-decoration:none;color:#eb6864;background-color:#ffffff;border:1px solid #dddddd;margin-left:-1px}.pagination>li:first-child>a,.pagination>li:first-child>span{margin-left:0;border-bottom-left-radius:4px;border-top-left-radius:4px}.pagination>li:last-child>a,.pagination>li:last-child>span{border-bottom-right-radius:4px;border-top-right-radius:4px}.pagination>li>a:hover,.pagination>li>span:hover,.pagination>li>a:focus,.pagination>li>span:focus{color:#e22620;background-color:#eeeeee;border-color:#dddddd}.pagination>.active>a,.pagination>.active>span,.pagination>.active>a:hover,.pagination>.active>span:hover,.pagination>.active>a:focus,.pagination>.active>span:focus{z-index:2;color:#999999;background-color:#f5f5f5;border-color:#dddddd;cursor:default}.pagination>.disabled>span,.pagination>.disabled>span:hover,.pagination>.disabled>span:focus,.pagination>.disabled>a,.pagination>.disabled>a:hover,.pagination>.disabled>a:focus{color:#999999;background-color:#ffffff;border-color:#dddddd;cursor:not-allowed}.pagination-lg>li>a,.pagination-lg>li>span{padding:14px 16px;font-size:19px}.pagination-lg>li:first-child>a,.pagination-lg>li:first-child>span{border-bottom-left-radius:6px;border-top-left-radius:6px}.pagination-lg>li:last-child>a,.pagination-lg>li:last-child>span{border-bottom-right-radius:6px;border-top-right-radius:6px}.pagination-sm>li>a,.pagination-sm>li>span{padding:5px 10px;font-size:13px}.pagination-sm>li:first-child>a,.pagination-sm>li:first-child>span{border-bottom-left-radius:3px;border-top-left-radius:3px}.pagination-sm>li:last-child>a,.pagination-sm>li:last-child>span{border-bottom-right-radius:3px;border-top-right-radius:3px}.pager{padding-left:0;margin:21px 0;list-style:none;text-align:center}.pager li{display:inline}.pager li>a,.pager li>span{display:inline-block;padding:5px 14px;background-color:#ffffff;border:1px solid #dddddd;border-radius:15px}.pager li>a:hover,.pager li>a:focus{text-decoration:none;background-color:#eeeeee}.pager .next>a,.pager .next>span{float:right}.pager .previous>a,.pager .previous>span{float:left}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{color:#999999;background-color:#ffffff;cursor:not-allowed}.label{display:inline;padding:.2em .6em .3em;font-size:75%;font-weight:bold;line-height:1;color:#ffffff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25em}a.label:hover,a.label:focus{color:#ffffff;text-decoration:none;cursor:pointer}.label:empty{display:none}.btn .label{position:relative;top:-1px}.label-default{background-color:#999999}.label-default[href]:hover,.label-default[href]:focus{background-color:#808080}.label-primary{background-color:#eb6864}.label-primary[href]:hover,.label-primary[href]:focus{background-color:#e53c37}.label-success{background-color:#22b24c}.label-success[href]:hover,.label-success[href]:focus{background-color:#1a873a}.label-info{background-color:#336699}.label-info[href]:hover,.label-info[href]:focus{background-color:#264c73}.label-warning{background-color:#f5e625}.label-warning[href]:hover,.label-warning[href]:focus{background-color:#ddce0a}.label-danger{background-color:#f57a00}.label-danger[href]:hover,.label-danger[href]:focus{background-color:#c26100}.badge{display:inline-block;min-width:10px;padding:3px 7px;font-size:13px;font-weight:bold;color:#ffffff;line-height:1;vertical-align:baseline;white-space:nowrap;text-align:center;background-color:#eb6864;border-radius:10px}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.btn-xs .badge{top:0;padding:1px 5px}a.badge:hover,a.badge:focus{color:#ffffff;text-decoration:none;cursor:pointer}.list-group-item.active>.badge,.nav-pills>.active>a>.badge{color:#eb6864;background-color:#ffffff}.list-group-item>.badge{float:right}.list-group-item>.badge+.badge{margin-right:5px}.nav-pills>li>a>.badge{margin-left:3px}.jumbotron{padding:30px 15px;margin-bottom:30px;color:inherit;background-color:#eeeeee}.jumbotron h1,.jumbotron .h1{color:inherit}.jumbotron p{margin-bottom:15px;font-size:23px;font-weight:200}.jumbotron>hr{border-top-color:#d5d5d5}.container .jumbotron,.container-fluid .jumbotron{border-radius:6px}.jumbotron .container{max-width:100%}@media screen and (min-width:768px){.jumbotron{padding:48px 0}.container .jumbotron,.container-fluid .jumbotron{padding-left:60px;padding-right:60px}.jumbotron h1,.jumbotron .h1{font-size:67.5px}}.thumbnail{display:block;padding:4px;margin-bottom:21px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:border .2s ease-in-out;-o-transition:border .2s ease-in-out;transition:border .2s ease-in-out}.thumbnail>img,.thumbnail a>img{margin-left:auto;margin-right:auto}a.thumbnail:hover,a.thumbnail:focus,a.thumbnail.active{border-color:#eb6864}.thumbnail .caption{padding:9px;color:#777777}.alert{padding:15px;margin-bottom:21px;border:1px solid transparent;border-radius:4px}.alert h4{margin-top:0;color:inherit}.alert .alert-link{font-weight:bold}.alert>p,.alert>ul{margin-bottom:0}.alert>p+p{margin-top:5px}.alert-dismissable,.alert-dismissible{padding-right:35px}.alert-dismissable .close,.alert-dismissible .close{position:relative;top:-2px;right:-21px;color:inherit}.alert-success{background-color:#dff0d8;border-color:#d6e9c6;color:#468847}.alert-success hr{border-top-color:#c9e2b3}.alert-success .alert-link{color:#356635}.alert-info{background-color:#d9edf7;border-color:#bce8f1;color:#3a87ad}.alert-info hr{border-top-color:#a6e1ec}.alert-info .alert-link{color:#2d6987}.alert-warning{background-color:#fcf8e3;border-color:#fbeed5;color:#c09853}.alert-warning hr{border-top-color:#f8e5be}.alert-warning .alert-link{color:#a47e3c}.alert-danger{background-color:#f2dede;border-color:#eed3d7;color:#b94a48}.alert-danger hr{border-top-color:#e6c1c7}.alert-danger .alert-link{color:#953b39}@-webkit-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@-o-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}.progress{overflow:hidden;height:21px;margin-bottom:21px;background-color:#f5f5f5;border-radius:4px;-webkit-box-shadow:inset 0 1px 2px rgba(0,0,0,0.1);box-shadow:inset 0 1px 2px rgba(0,0,0,0.1)}.progress-bar{float:left;width:0%;height:100%;font-size:13px;line-height:21px;color:#ffffff;text-align:center;background-color:#eb6864;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);-webkit-transition:width 0.6s ease;-o-transition:width 0.6s ease;transition:width 0.6s ease}.progress-striped .progress-bar,.progress-bar-striped{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);-webkit-background-size:40px 40px;background-size:40px 40px}.progress.active .progress-bar,.progress-bar.active{-webkit-animation:progress-bar-stripes 2s linear infinite;-o-animation:progress-bar-stripes 2s linear infinite;animation:progress-bar-stripes 2s linear infinite}.progress-bar-success{background-color:#22b24c}.progress-striped .progress-bar-success{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-info{background-color:#336699}.progress-striped .progress-bar-info{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-warning{background-color:#f5e625}.progress-striped .progress-bar-warning{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-danger{background-color:#f57a00}.progress-striped .progress-bar-danger{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.media{margin-top:15px}.media:first-child{margin-top:0}.media-right,.media>.pull-right{padding-left:10px}.media-left,.media>.pull-left{padding-right:10px}.media-left,.media-right,.media-body{display:table-cell;vertical-align:top}.media-middle{vertical-align:middle}.media-bottom{vertical-align:bottom}.media-heading{margin-top:0;margin-bottom:5px}.media-list{padding-left:0;list-style:none}.list-group{margin-bottom:20px;padding-left:0}.list-group-item{position:relative;display:block;padding:10px 15px;margin-bottom:-1px;background-color:#ffffff;border:1px solid #dddddd}.list-group-item:first-child{border-top-right-radius:4px;border-top-left-radius:4px}.list-group-item:last-child{margin-bottom:0;border-bottom-right-radius:4px;border-bottom-left-radius:4px}a.list-group-item{color:#555555}a.list-group-item .list-group-item-heading{color:#333333}a.list-group-item:hover,a.list-group-item:focus{text-decoration:none;color:#555555;background-color:#f5f5f5}.list-group-item.disabled,.list-group-item.disabled:hover,.list-group-item.disabled:focus{background-color:#eeeeee;color:#999999;cursor:not-allowed}.list-group-item.disabled .list-group-item-heading,.list-group-item.disabled:hover .list-group-item-heading,.list-group-item.disabled:focus .list-group-item-heading{color:inherit}.list-group-item.disabled .list-group-item-text,.list-group-item.disabled:hover .list-group-item-text,.list-group-item.disabled:focus .list-group-item-text{color:#999999}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{z-index:2;color:#ffffff;background-color:#eb6864;border-color:#eb6864}.list-group-item.active .list-group-item-heading,.list-group-item.active:hover .list-group-item-heading,.list-group-item.active:focus .list-group-item-heading,.list-group-item.active .list-group-item-heading>small,.list-group-item.active:hover .list-group-item-heading>small,.list-group-item.active:focus .list-group-item-heading>small,.list-group-item.active .list-group-item-heading>.small,.list-group-item.active:hover .list-group-item-heading>.small,.list-group-item.active:focus .list-group-item-heading>.small{color:inherit}.list-group-item.active .list-group-item-text,.list-group-item.active:hover .list-group-item-text,.list-group-item.active:focus .list-group-item-text{color:#ffffff}.list-group-item-success{color:#468847;background-color:#dff0d8}a.list-group-item-success{color:#468847}a.list-group-item-success .list-group-item-heading{color:inherit}a.list-group-item-success:hover,a.list-group-item-success:focus{color:#468847;background-color:#d0e9c6}a.list-group-item-success.active,a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{color:#fff;background-color:#468847;border-color:#468847}.list-group-item-info{color:#3a87ad;background-color:#d9edf7}a.list-group-item-info{color:#3a87ad}a.list-group-item-info .list-group-item-heading{color:inherit}a.list-group-item-info:hover,a.list-group-item-info:focus{color:#3a87ad;background-color:#c4e3f3}a.list-group-item-info.active,a.list-group-item-info.active:hover,a.list-group-item-info.active:focus{color:#fff;background-color:#3a87ad;border-color:#3a87ad}.list-group-item-warning{color:#c09853;background-color:#fcf8e3}a.list-group-item-warning{color:#c09853}a.list-group-item-warning .list-group-item-heading{color:inherit}a.list-group-item-warning:hover,a.list-group-item-warning:focus{color:#c09853;background-color:#faf2cc}a.list-group-item-warning.active,a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{color:#fff;background-color:#c09853;border-color:#c09853}.list-group-item-danger{color:#b94a48;background-color:#f2dede}a.list-group-item-danger{color:#b94a48}a.list-group-item-danger .list-group-item-heading{color:inherit}a.list-group-item-danger:hover,a.list-group-item-danger:focus{color:#b94a48;background-color:#ebcccc}a.list-group-item-danger.active,a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{color:#fff;background-color:#b94a48;border-color:#b94a48}.list-group-item-heading{margin-top:0;margin-bottom:5px}.list-group-item-text{margin-bottom:0;line-height:1.3}.panel{margin-bottom:21px;background-color:#ffffff;border:1px solid transparent;border-radius:4px;-webkit-box-shadow:0 1px 1px rgba(0,0,0,0.05);box-shadow:0 1px 1px rgba(0,0,0,0.05)}.panel-body{padding:15px}.panel-heading{padding:10px 15px;border-bottom:1px solid transparent;border-top-right-radius:3px;border-top-left-radius:3px}.panel-heading>.dropdown .dropdown-toggle{color:inherit}.panel-title{margin-top:0;margin-bottom:0;font-size:17px;color:inherit}.panel-title>a{color:inherit}.panel-footer{padding:10px 15px;background-color:#f5f5f5;border-top:1px solid #dddddd;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.list-group,.panel>.panel-collapse>.list-group{margin-bottom:0}.panel>.list-group .list-group-item,.panel>.panel-collapse>.list-group .list-group-item{border-width:1px 0;border-radius:0}.panel>.list-group:first-child .list-group-item:first-child,.panel>.panel-collapse>.list-group:first-child .list-group-item:first-child{border-top:0;border-top-right-radius:3px;border-top-left-radius:3px}.panel>.list-group:last-child .list-group-item:last-child,.panel>.panel-collapse>.list-group:last-child .list-group-item:last-child{border-bottom:0;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel-heading+.list-group .list-group-item:first-child{border-top-width:0}.list-group+.panel-footer{border-top-width:0}.panel>.table,.panel>.table-responsive>.table,.panel>.panel-collapse>.table{margin-bottom:0}.panel>.table caption,.panel>.table-responsive>.table caption,.panel>.panel-collapse>.table caption{padding-left:15px;padding-right:15px}.panel>.table:first-child,.panel>.table-responsive:first-child>.table:first-child{border-top-right-radius:3px;border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child{border-top-left-radius:3px;border-top-right-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:first-child{border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:last-child{border-top-right-radius:3px}.panel>.table:last-child,.panel>.table-responsive:last-child>.table:last-child{border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child{border-bottom-left-radius:3px;border-bottom-right-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:first-child{border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:last-child{border-bottom-right-radius:3px}.panel>.panel-body+.table,.panel>.panel-body+.table-responsive,.panel>.table+.panel-body,.panel>.table-responsive+.panel-body{border-top:1px solid #dddddd}.panel>.table>tbody:first-child>tr:first-child th,.panel>.table>tbody:first-child>tr:first-child td{border-top:0}.panel>.table-bordered,.panel>.table-responsive>.table-bordered{border:0}.panel>.table-bordered>thead>tr>th:first-child,.panel>.table-responsive>.table-bordered>thead>tr>th:first-child,.panel>.table-bordered>tbody>tr>th:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:first-child,.panel>.table-bordered>tfoot>tr>th:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:first-child,.panel>.table-bordered>thead>tr>td:first-child,.panel>.table-responsive>.table-bordered>thead>tr>td:first-child,.panel>.table-bordered>tbody>tr>td:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:first-child,.panel>.table-bordered>tfoot>tr>td:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.panel>.table-bordered>thead>tr>th:last-child,.panel>.table-responsive>.table-bordered>thead>tr>th:last-child,.panel>.table-bordered>tbody>tr>th:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:last-child,.panel>.table-bordered>tfoot>tr>th:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:last-child,.panel>.table-bordered>thead>tr>td:last-child,.panel>.table-responsive>.table-bordered>thead>tr>td:last-child,.panel>.table-bordered>tbody>tr>td:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:last-child,.panel>.table-bordered>tfoot>tr>td:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.panel>.table-bordered>thead>tr:first-child>td,.panel>.table-responsive>.table-bordered>thead>tr:first-child>td,.panel>.table-bordered>tbody>tr:first-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>td,.panel>.table-bordered>thead>tr:first-child>th,.panel>.table-responsive>.table-bordered>thead>tr:first-child>th,.panel>.table-bordered>tbody>tr:first-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>th{border-bottom:0}.panel>.table-bordered>tbody>tr:last-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>td,.panel>.table-bordered>tfoot>tr:last-child>td,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>td,.panel>.table-bordered>tbody>tr:last-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>th,.panel>.table-bordered>tfoot>tr:last-child>th,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>th{border-bottom:0}.panel>.table-responsive{border:0;margin-bottom:0}.panel-group{margin-bottom:21px}.panel-group .panel{margin-bottom:0;border-radius:4px}.panel-group .panel+.panel{margin-top:5px}.panel-group .panel-heading{border-bottom:0}.panel-group .panel-heading+.panel-collapse>.panel-body,.panel-group .panel-heading+.panel-collapse>.list-group{border-top:1px solid #dddddd}.panel-group .panel-footer{border-top:0}.panel-group .panel-footer+.panel-collapse .panel-body{border-bottom:1px solid #dddddd}.panel-default{border-color:#dddddd}.panel-default>.panel-heading{color:#777777;background-color:#f5f5f5;border-color:#dddddd}.panel-default>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-default>.panel-heading .badge{color:#f5f5f5;background-color:#777777}.panel-default>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-primary{border-color:#eb6864}.panel-primary>.panel-heading{color:#ffffff;background-color:#eb6864;border-color:#eb6864}.panel-primary>.panel-heading+.panel-collapse>.panel-body{border-top-color:#eb6864}.panel-primary>.panel-heading .badge{color:#eb6864;background-color:#ffffff}.panel-primary>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#eb6864}.panel-success{border-color:#22b24c}.panel-success>.panel-heading{color:#468847;background-color:#22b24c;border-color:#22b24c}.panel-success>.panel-heading+.panel-collapse>.panel-body{border-top-color:#22b24c}.panel-success>.panel-heading .badge{color:#22b24c;background-color:#468847}.panel-success>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#22b24c}.panel-info{border-color:#336699}.panel-info>.panel-heading{color:#3a87ad;background-color:#336699;border-color:#336699}.panel-info>.panel-heading+.panel-collapse>.panel-body{border-top-color:#336699}.panel-info>.panel-heading .badge{color:#336699;background-color:#3a87ad}.panel-info>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#336699}.panel-warning{border-color:#f5e625}.panel-warning>.panel-heading{color:#c09853;background-color:#f5e625;border-color:#f5e625}.panel-warning>.panel-heading+.panel-collapse>.panel-body{border-top-color:#f5e625}.panel-warning>.panel-heading .badge{color:#f5e625;background-color:#c09853}.panel-warning>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#f5e625}.panel-danger{border-color:#f57a00}.panel-danger>.panel-heading{color:#b94a48;background-color:#f57a00;border-color:#f57a00}.panel-danger>.panel-heading+.panel-collapse>.panel-body{border-top-color:#f57a00}.panel-danger>.panel-heading .badge{color:#f57a00;background-color:#b94a48}.panel-danger>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#f57a00}.embed-responsive{position:relative;display:block;height:0;padding:0;overflow:hidden}.embed-responsive .embed-responsive-item,.embed-responsive iframe,.embed-responsive embed,.embed-responsive object,.embed-responsive video{position:absolute;top:0;left:0;bottom:0;height:100%;width:100%;border:0}.embed-responsive.embed-responsive-16by9{padding-bottom:56.25%}.embed-responsive.embed-responsive-4by3{padding-bottom:75%}.well{min-height:20px;padding:19px;margin-bottom:20px;background-color:#f5f5f5;border:1px solid #e3e3e3;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.05);box-shadow:inset 0 1px 1px rgba(0,0,0,0.05)}.well blockquote{border-color:#ddd;border-color:rgba(0,0,0,0.15)}.well-lg{padding:24px;border-radius:6px}.well-sm{padding:9px;border-radius:3px}.close{float:right;font-size:22.5px;font-weight:bold;line-height:1;color:#000000;text-shadow:0 1px 0 #ffffff;opacity:0.2;filter:alpha(opacity=20)}.close:hover,.close:focus{color:#000000;text-decoration:none;cursor:pointer;opacity:0.5;filter:alpha(opacity=50)}button.close{padding:0;cursor:pointer;background:transparent;border:0;-webkit-appearance:none}.modal-open{overflow:hidden}.modal{display:none;overflow:hidden;position:fixed;top:0;right:0;bottom:0;left:0;z-index:1040;-webkit-overflow-scrolling:touch;outline:0}.modal.fade .modal-dialog{-webkit-transform:translate(0, -25%);-ms-transform:translate(0, -25%);-o-transform:translate(0, -25%);transform:translate(0, -25%);-webkit-transition:-webkit-transform .3s ease-out;-o-transition:-o-transform .3s ease-out;transition:transform .3s ease-out}.modal.in .modal-dialog{-webkit-transform:translate(0, 0);-ms-transform:translate(0, 0);-o-transform:translate(0, 0);transform:translate(0, 0)}.modal-open .modal{overflow-x:hidden;overflow-y:auto}.modal-dialog{position:relative;width:auto;margin:10px}.modal-content{position:relative;background-color:#ffffff;border:1px solid #999999;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 3px 9px rgba(0,0,0,0.5);box-shadow:0 3px 9px rgba(0,0,0,0.5);-webkit-background-clip:padding-box;background-clip:padding-box;outline:0}.modal-backdrop{position:absolute;top:0;right:0;left:0;background-color:#000000}.modal-backdrop.fade{opacity:0;filter:alpha(opacity=0)}.modal-backdrop.in{opacity:0.5;filter:alpha(opacity=50)}.modal-header{padding:15px;border-bottom:1px solid #e5e5e5;min-height:16.42857143px}.modal-header .close{margin-top:-2px}.modal-title{margin:0;line-height:1.42857143}.modal-body{position:relative;padding:20px}.modal-footer{padding:20px;text-align:right;border-top:1px solid #e5e5e5}.modal-footer .btn+.btn{margin-left:5px;margin-bottom:0}.modal-footer .btn-group .btn+.btn{margin-left:-1px}.modal-footer .btn-block+.btn-block{margin-left:0}.modal-scrollbar-measure{position:absolute;top:-9999px;width:50px;height:50px;overflow:scroll}@media (min-width:768px){.modal-dialog{width:600px;margin:30px auto}.modal-content{-webkit-box-shadow:0 5px 15px rgba(0,0,0,0.5);box-shadow:0 5px 15px rgba(0,0,0,0.5)}.modal-sm{width:300px}}@media (min-width:992px){.modal-lg{width:900px}}.tooltip{position:absolute;z-index:1070;display:block;visibility:visible;font-family:Georgia,"Times New Roman",Times,serif;font-size:13px;font-weight:normal;line-height:1.4;opacity:0;filter:alpha(opacity=0)}.tooltip.in{opacity:0.9;filter:alpha(opacity=90)}.tooltip.top{margin-top:-3px;padding:5px 0}.tooltip.right{margin-left:3px;padding:0 5px}.tooltip.bottom{margin-top:3px;padding:5px 0}.tooltip.left{margin-left:-3px;padding:0 5px}.tooltip-inner{max-width:200px;padding:3px 8px;color:#ffffff;text-align:center;text-decoration:none;background-color:rgba(0,0,0,0.9);border-radius:4px}.tooltip-arrow{position:absolute;width:0;height:0;border-color:transparent;border-style:solid}.tooltip.top .tooltip-arrow{bottom:0;left:50%;margin-left:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-left .tooltip-arrow{bottom:0;right:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-right .tooltip-arrow{bottom:0;left:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.right .tooltip-arrow{top:50%;left:0;margin-top:-5px;border-width:5px 5px 5px 0;border-right-color:rgba(0,0,0,0.9)}.tooltip.left .tooltip-arrow{top:50%;right:0;margin-top:-5px;border-width:5px 0 5px 5px;border-left-color:rgba(0,0,0,0.9)}.tooltip.bottom .tooltip-arrow{top:0;left:50%;margin-left:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-left .tooltip-arrow{top:0;right:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-right .tooltip-arrow{top:0;left:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.popover{position:absolute;top:0;left:0;z-index:1060;display:none;max-width:276px;padding:1px;font-family:Georgia,"Times New Roman",Times,serif;font-size:15px;font-weight:normal;line-height:1.42857143;text-align:left;background-color:#ffffff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 5px 10px rgba(0,0,0,0.2);box-shadow:0 5px 10px rgba(0,0,0,0.2);white-space:normal}.popover.top{margin-top:-10px}.popover.right{margin-left:10px}.popover.bottom{margin-top:10px}.popover.left{margin-left:-10px}.popover-title{margin:0;padding:8px 14px;font-size:15px;background-color:#f7f7f7;border-bottom:1px solid #ebebeb;border-radius:5px 5px 0 0}.popover-content{padding:9px 14px}.popover>.arrow,.popover>.arrow:after{position:absolute;display:block;width:0;height:0;border-color:transparent;border-style:solid}.popover>.arrow{border-width:11px}.popover>.arrow:after{border-width:10px;content:""}.popover.top>.arrow{left:50%;margin-left:-11px;border-bottom-width:0;border-top-color:#999999;border-top-color:rgba(0,0,0,0.25);bottom:-11px}.popover.top>.arrow:after{content:" ";bottom:1px;margin-left:-10px;border-bottom-width:0;border-top-color:#ffffff}.popover.right>.arrow{top:50%;left:-11px;margin-top:-11px;border-left-width:0;border-right-color:#999999;border-right-color:rgba(0,0,0,0.25)}.popover.right>.arrow:after{content:" ";left:1px;bottom:-10px;border-left-width:0;border-right-color:#ffffff}.popover.bottom>.arrow{left:50%;margin-left:-11px;border-top-width:0;border-bottom-color:#999999;border-bottom-color:rgba(0,0,0,0.25);top:-11px}.popover.bottom>.arrow:after{content:" ";top:1px;margin-left:-10px;border-top-width:0;border-bottom-color:#ffffff}.popover.left>.arrow{top:50%;right:-11px;margin-top:-11px;border-right-width:0;border-left-color:#999999;border-left-color:rgba(0,0,0,0.25)}.popover.left>.arrow:after{content:" ";right:1px;border-right-width:0;border-left-color:#ffffff;bottom:-10px}.carousel{position:relative}.carousel-inner{position:relative;overflow:hidden;width:100%}.carousel-inner>.item{display:none;position:relative;-webkit-transition:.6s ease-in-out left;-o-transition:.6s ease-in-out left;transition:.6s ease-in-out left}.carousel-inner>.item>img,.carousel-inner>.item>a>img{line-height:1}@media all and (transform-3d),(-webkit-transform-3d){.carousel-inner>.item{-webkit-transition:-webkit-transform .6s ease-in-out;-o-transition:-o-transform .6s ease-in-out;transition:transform .6s ease-in-out;-webkit-backface-visibility:hidden;backface-visibility:hidden;-webkit-perspective:1000;perspective:1000}.carousel-inner>.item.next,.carousel-inner>.item.active.right{-webkit-transform:translate3d(100%, 0, 0);transform:translate3d(100%, 0, 0);left:0}.carousel-inner>.item.prev,.carousel-inner>.item.active.left{-webkit-transform:translate3d(-100%, 0, 0);transform:translate3d(-100%, 0, 0);left:0}.carousel-inner>.item.next.left,.carousel-inner>.item.prev.right,.carousel-inner>.item.active{-webkit-transform:translate3d(0, 0, 0);transform:translate3d(0, 0, 0);left:0}}.carousel-inner>.active,.carousel-inner>.next,.carousel-inner>.prev{display:block}.carousel-inner>.active{left:0}.carousel-inner>.next,.carousel-inner>.prev{position:absolute;top:0;width:100%}.carousel-inner>.next{left:100%}.carousel-inner>.prev{left:-100%}.carousel-inner>.next.left,.carousel-inner>.prev.right{left:0}.carousel-inner>.active.left{left:-100%}.carousel-inner>.active.right{left:100%}.carousel-control{position:absolute;top:0;left:0;bottom:0;width:15%;opacity:0.5;filter:alpha(opacity=50);font-size:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-control.left{background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.5)), to(rgba(0,0,0,0.0001)));background-image:linear-gradient(to right, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1)}.carousel-control.right{left:auto;right:0;background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.0001)), to(rgba(0,0,0,0.5)));background-image:linear-gradient(to right, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1)}.carousel-control:hover,.carousel-control:focus{outline:0;color:#ffffff;text-decoration:none;opacity:0.9;filter:alpha(opacity=90)}.carousel-control .icon-prev,.carousel-control .icon-next,.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right{position:absolute;top:50%;z-index:5;display:inline-block}.carousel-control .icon-prev,.carousel-control .glyphicon-chevron-left{left:50%;margin-left:-10px}.carousel-control .icon-next,.carousel-control .glyphicon-chevron-right{right:50%;margin-right:-10px}.carousel-control .icon-prev,.carousel-control .icon-next{width:20px;height:20px;margin-top:-10px;font-family:serif}.carousel-control .icon-prev:before{content:'\2039'}.carousel-control .icon-next:before{content:'\203a'}.carousel-indicators{position:absolute;bottom:10px;left:50%;z-index:15;width:60%;margin-left:-30%;padding-left:0;list-style:none;text-align:center}.carousel-indicators li{display:inline-block;width:10px;height:10px;margin:1px;text-indent:-999px;border:1px solid #ffffff;border-radius:10px;cursor:pointer;background-color:#000 \9;background-color:rgba(0,0,0,0)}.carousel-indicators .active{margin:0;width:12px;height:12px;background-color:#ffffff}.carousel-caption{position:absolute;left:15%;right:15%;bottom:20px;z-index:10;padding-top:20px;padding-bottom:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-caption .btn{text-shadow:none}@media screen and (min-width:768px){.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right,.carousel-control .icon-prev,.carousel-control .icon-next{width:30px;height:30px;margin-top:-15px;font-size:30px}.carousel-control .glyphicon-chevron-left,.carousel-control .icon-prev{margin-left:-15px}.carousel-control .glyphicon-chevron-right,.carousel-control .icon-next{margin-right:-15px}.carousel-caption{left:20%;right:20%;padding-bottom:30px}.carousel-indicators{bottom:20px}}.clearfix:before,.clearfix:after,.dl-horizontal dd:before,.dl-horizontal dd:after,.container:before,.container:after,.container-fluid:before,.container-fluid:after,.row:before,.row:after,.form-horizontal .form-group:before,.form-horizontal .form-group:after,.btn-toolbar:before,.btn-toolbar:after,.btn-group-vertical>.btn-group:before,.btn-group-vertical>.btn-group:after,.nav:before,.nav:after,.navbar:before,.navbar:after,.navbar-header:before,.navbar-header:after,.navbar-collapse:before,.navbar-collapse:after,.pager:before,.pager:after,.panel-body:before,.panel-body:after,.modal-footer:before,.modal-footer:after{content:" ";display:table}.clearfix:after,.dl-horizontal dd:after,.container:after,.container-fluid:after,.row:after,.form-horizontal .form-group:after,.btn-toolbar:after,.btn-group-vertical>.btn-group:after,.nav:after,.navbar:after,.navbar-header:after,.navbar-collapse:after,.pager:after,.panel-body:after,.modal-footer:after{clear:both}.center-block{display:block;margin-left:auto;margin-right:auto}.pull-right{float:right !important}.pull-left{float:left !important}.hide{display:none !important}.show{display:block !important}.invisible{visibility:hidden}.text-hide{font:0/0 a;color:transparent;text-shadow:none;background-color:transparent;border:0}.hidden{display:none !important;visibility:hidden !important}.affix{position:fixed}@-ms-viewport{width:device-width}.visible-xs,.visible-sm,.visible-md,.visible-lg{display:none !important}.visible-xs-block,.visible-xs-inline,.visible-xs-inline-block,.visible-sm-block,.visible-sm-inline,.visible-sm-inline-block,.visible-md-block,.visible-md-inline,.visible-md-inline-block,.visible-lg-block,.visible-lg-inline,.visible-lg-inline-block{display:none !important}@media (max-width:767px){.visible-xs{display:block !important}table.visible-xs{display:table}tr.visible-xs{display:table-row !important}th.visible-xs,td.visible-xs{display:table-cell !important}}@media (max-width:767px){.visible-xs-block{display:block !important}}@media (max-width:767px){.visible-xs-inline{display:inline !important}}@media (max-width:767px){.visible-xs-inline-block{display:inline-block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm{display:block !important}table.visible-sm{display:table}tr.visible-sm{display:table-row !important}th.visible-sm,td.visible-sm{display:table-cell !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-block{display:block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline{display:inline !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline-block{display:inline-block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md{display:block !important}table.visible-md{display:table}tr.visible-md{display:table-row !important}th.visible-md,td.visible-md{display:table-cell !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-block{display:block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline{display:inline !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline-block{display:inline-block !important}}@media (min-width:1200px){.visible-lg{display:block !important}table.visible-lg{display:table}tr.visible-lg{display:table-row !important}th.visible-lg,td.visible-lg{display:table-cell !important}}@media (min-width:1200px){.visible-lg-block{display:block !important}}@media (min-width:1200px){.visible-lg-inline{display:inline !important}}@media (min-width:1200px){.visible-lg-inline-block{display:inline-block !important}}@media (max-width:767px){.hidden-xs{display:none !important}}@media (min-width:768px) and (max-width:991px){.hidden-sm{display:none !important}}@media (min-width:992px) and (max-width:1199px){.hidden-md{display:none !important}}@media (min-width:1200px){.hidden-lg{display:none !important}}.visible-print{display:none !important}@media print{.visible-print{display:block !important}table.visible-print{display:table}tr.visible-print{display:table-row !important}th.visible-print,td.visible-print{display:table-cell !important}}.visible-print-block{display:none !important}@media print{.visible-print-block{display:block !important}}.visible-print-inline{display:none !important}@media print{.visible-print-inline{display:inline !important}}.visible-print-inline-block{display:none !important}@media print{.visible-print-inline-block{display:inline-block !important}}@media print{.hidden-print{display:none !important}}.navbar{font-size:18px;font-family:"News Cycle","Arial Narrow Bold",sans-serif;font-weight:700}.navbar-default .badge{background-color:#000;color:#fff}.navbar-inverse .badge{background-color:#fff;color:#eb6864}.navbar-brand{font-size:18px;font-weight:700;text-transform:uppercase}.has-warning .help-block,.has-warning .control-label,.has-warning .form-control-feedback{color:#f57a00}.has-warning .form-control,.has-warning .form-control:focus{border-color:#f57a00}.has-error .help-block,.has-error .control-label,.has-error .form-control-feedback{color:#eb6864}.has-error .form-control,.has-error .form-control:focus{border-color:#eb6864}.has-success .help-block,.has-success .control-label,.has-success .form-control-feedback{color:#22b24c}.has-success .form-control,.has-success .form-control:focus{border-color:#22b24c}.badge{padding-bottom:4px;vertical-align:3px;font-size:10px}.jumbotron h1,.jumbotron h2,.jumbotron h3,.jumbotron h4,.jumbotron h5,.jumbotron h6{font-family:"News Cycle","Arial Narrow Bold",sans-serif;font-weight:700;color:#000}.panel-primary .panel-title,.panel-success .panel-title,.panel-warning .panel-title,.panel-danger .panel-title,.panel-info .panel-title{color:#fff} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/css/readable.min.css b/www/bootstrap-3.3.1/css/readable.min.css deleted file mode 100644 index 3dac2c0..0000000 --- a/www/bootstrap-3.3.1/css/readable.min.css +++ /dev/null @@ -1,20 +0,0 @@ -@font-face { - font-family: 'Raleway'; - font-style: normal; - font-weight: 400; - src: url(fonts/Raleway.ttf) format('truetype'); -} -@font-face { - font-family: 'Raleway'; - font-style: normal; - font-weight: 700; - src: url(fonts/RalewayBold.ttf) format('truetype'); -} - -/*! - * bootswatch v3.3.1+1 - * Homepage: http://bootswatch.com - * Copyright 2012-2014 Thomas Park - * Licensed under MIT - * Based on Bootstrap -*//*! normalize.css v3.0.2 | MIT License | git.io/normalize */html{font-family:sans-serif;-ms-text-size-adjust:100%;-webkit-text-size-adjust:100%}body{margin:0}article,aside,details,figcaption,figure,footer,header,hgroup,main,menu,nav,section,summary{display:block}audio,canvas,progress,video{display:inline-block;vertical-align:baseline}audio:not([controls]){display:none;height:0}[hidden],template{display:none}a{background-color:transparent}a:active,a:hover{outline:0}abbr[title]{border-bottom:1px dotted}b,strong{font-weight:bold}dfn{font-style:italic}h1{font-size:2em;margin:0.67em 0}mark{background:#ff0;color:#000}small{font-size:80%}sub,sup{font-size:75%;line-height:0;position:relative;vertical-align:baseline}sup{top:-0.5em}sub{bottom:-0.25em}img{border:0}svg:not(:root){overflow:hidden}figure{margin:1em 40px}hr{-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box;height:0}pre{overflow:auto}code,kbd,pre,samp{font-family:monospace, monospace;font-size:1em}button,input,optgroup,select,textarea{color:inherit;font:inherit;margin:0}button{overflow:visible}button,select{text-transform:none}button,html input[type="button"],input[type="reset"],input[type="submit"]{-webkit-appearance:button;cursor:pointer}button[disabled],html input[disabled]{cursor:default}button::-moz-focus-inner,input::-moz-focus-inner{border:0;padding:0}input{line-height:normal}input[type="checkbox"],input[type="radio"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box;padding:0}input[type="number"]::-webkit-inner-spin-button,input[type="number"]::-webkit-outer-spin-button{height:auto}input[type="search"]{-webkit-appearance:textfield;-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box}input[type="search"]::-webkit-search-cancel-button,input[type="search"]::-webkit-search-decoration{-webkit-appearance:none}fieldset{border:1px solid #c0c0c0;margin:0 2px;padding:0.35em 0.625em 0.75em}legend{border:0;padding:0}textarea{overflow:auto}optgroup{font-weight:bold}table{border-collapse:collapse;border-spacing:0}td,th{padding:0}/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */@media print{*,*:before,*:after{background:transparent !important;color:#000 !important;-webkit-box-shadow:none !important;box-shadow:none !important;text-shadow:none !important}a,a:visited{text-decoration:underline}a[href]:after{content:" (" attr(href) ")"}abbr[title]:after{content:" (" attr(title) ")"}a[href^="#"]:after,a[href^="javascript:"]:after{content:""}pre,blockquote{border:1px solid #999;page-break-inside:avoid}thead{display:table-header-group}tr,img{page-break-inside:avoid}img{max-width:100% !important}p,h2,h3{orphans:3;widows:3}h2,h3{page-break-after:avoid}select{background:#fff !important}.navbar{display:none}.btn>.caret,.dropup>.btn>.caret{border-top-color:#000 !important}.label{border:1px solid #000}.table{border-collapse:collapse !important}.table td,.table th{background-color:#fff !important}.table-bordered th,.table-bordered td{border:1px solid #ddd !important}}@font-face{font-family:'Glyphicons Halflings';src:url('../fonts/glyphicons-halflings-regular.eot');src:url('../fonts/glyphicons-halflings-regular.eot?#iefix') format('embedded-opentype'),url('../fonts/glyphicons-halflings-regular.woff') format('woff'),url('../fonts/glyphicons-halflings-regular.ttf') format('truetype'),url('../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular') format('svg')}.glyphicon{position:relative;top:1px;display:inline-block;font-family:'Glyphicons Halflings';font-style:normal;font-weight:normal;line-height:1;-webkit-font-smoothing:antialiased;-moz-osx-font-smoothing:grayscale}.glyphicon-asterisk:before{content:"\2a"}.glyphicon-plus:before{content:"\2b"}.glyphicon-euro:before,.glyphicon-eur:before{content:"\20ac"}.glyphicon-minus:before{content:"\2212"}.glyphicon-cloud:before{content:"\2601"}.glyphicon-envelope:before{content:"\2709"}.glyphicon-pencil:before{content:"\270f"}.glyphicon-glass:before{content:"\e001"}.glyphicon-music:before{content:"\e002"}.glyphicon-search:before{content:"\e003"}.glyphicon-heart:before{content:"\e005"}.glyphicon-star:before{content:"\e006"}.glyphicon-star-empty:before{content:"\e007"}.glyphicon-user:before{content:"\e008"}.glyphicon-film:before{content:"\e009"}.glyphicon-th-large:before{content:"\e010"}.glyphicon-th:before{content:"\e011"}.glyphicon-th-list:before{content:"\e012"}.glyphicon-ok:before{content:"\e013"}.glyphicon-remove:before{content:"\e014"}.glyphicon-zoom-in:before{content:"\e015"}.glyphicon-zoom-out:before{content:"\e016"}.glyphicon-off:before{content:"\e017"}.glyphicon-signal:before{content:"\e018"}.glyphicon-cog:before{content:"\e019"}.glyphicon-trash:before{content:"\e020"}.glyphicon-home:before{content:"\e021"}.glyphicon-file:before{content:"\e022"}.glyphicon-time:before{content:"\e023"}.glyphicon-road:before{content:"\e024"}.glyphicon-download-alt:before{content:"\e025"}.glyphicon-download:before{content:"\e026"}.glyphicon-upload:before{content:"\e027"}.glyphicon-inbox:before{content:"\e028"}.glyphicon-play-circle:before{content:"\e029"}.glyphicon-repeat:before{content:"\e030"}.glyphicon-refresh:before{content:"\e031"}.glyphicon-list-alt:before{content:"\e032"}.glyphicon-lock:before{content:"\e033"}.glyphicon-flag:before{content:"\e034"}.glyphicon-headphones:before{content:"\e035"}.glyphicon-volume-off:before{content:"\e036"}.glyphicon-volume-down:before{content:"\e037"}.glyphicon-volume-up:before{content:"\e038"}.glyphicon-qrcode:before{content:"\e039"}.glyphicon-barcode:before{content:"\e040"}.glyphicon-tag:before{content:"\e041"}.glyphicon-tags:before{content:"\e042"}.glyphicon-book:before{content:"\e043"}.glyphicon-bookmark:before{content:"\e044"}.glyphicon-print:before{content:"\e045"}.glyphicon-camera:before{content:"\e046"}.glyphicon-font:before{content:"\e047"}.glyphicon-bold:before{content:"\e048"}.glyphicon-italic:before{content:"\e049"}.glyphicon-text-height:before{content:"\e050"}.glyphicon-text-width:before{content:"\e051"}.glyphicon-align-left:before{content:"\e052"}.glyphicon-align-center:before{content:"\e053"}.glyphicon-align-right:before{content:"\e054"}.glyphicon-align-justify:before{content:"\e055"}.glyphicon-list:before{content:"\e056"}.glyphicon-indent-left:before{content:"\e057"}.glyphicon-indent-right:before{content:"\e058"}.glyphicon-facetime-video:before{content:"\e059"}.glyphicon-picture:before{content:"\e060"}.glyphicon-map-marker:before{content:"\e062"}.glyphicon-adjust:before{content:"\e063"}.glyphicon-tint:before{content:"\e064"}.glyphicon-edit:before{content:"\e065"}.glyphicon-share:before{content:"\e066"}.glyphicon-check:before{content:"\e067"}.glyphicon-move:before{content:"\e068"}.glyphicon-step-backward:before{content:"\e069"}.glyphicon-fast-backward:before{content:"\e070"}.glyphicon-backward:before{content:"\e071"}.glyphicon-play:before{content:"\e072"}.glyphicon-pause:before{content:"\e073"}.glyphicon-stop:before{content:"\e074"}.glyphicon-forward:before{content:"\e075"}.glyphicon-fast-forward:before{content:"\e076"}.glyphicon-step-forward:before{content:"\e077"}.glyphicon-eject:before{content:"\e078"}.glyphicon-chevron-left:before{content:"\e079"}.glyphicon-chevron-right:before{content:"\e080"}.glyphicon-plus-sign:before{content:"\e081"}.glyphicon-minus-sign:before{content:"\e082"}.glyphicon-remove-sign:before{content:"\e083"}.glyphicon-ok-sign:before{content:"\e084"}.glyphicon-question-sign:before{content:"\e085"}.glyphicon-info-sign:before{content:"\e086"}.glyphicon-screenshot:before{content:"\e087"}.glyphicon-remove-circle:before{content:"\e088"}.glyphicon-ok-circle:before{content:"\e089"}.glyphicon-ban-circle:before{content:"\e090"}.glyphicon-arrow-left:before{content:"\e091"}.glyphicon-arrow-right:before{content:"\e092"}.glyphicon-arrow-up:before{content:"\e093"}.glyphicon-arrow-down:before{content:"\e094"}.glyphicon-share-alt:before{content:"\e095"}.glyphicon-resize-full:before{content:"\e096"}.glyphicon-resize-small:before{content:"\e097"}.glyphicon-exclamation-sign:before{content:"\e101"}.glyphicon-gift:before{content:"\e102"}.glyphicon-leaf:before{content:"\e103"}.glyphicon-fire:before{content:"\e104"}.glyphicon-eye-open:before{content:"\e105"}.glyphicon-eye-close:before{content:"\e106"}.glyphicon-warning-sign:before{content:"\e107"}.glyphicon-plane:before{content:"\e108"}.glyphicon-calendar:before{content:"\e109"}.glyphicon-random:before{content:"\e110"}.glyphicon-comment:before{content:"\e111"}.glyphicon-magnet:before{content:"\e112"}.glyphicon-chevron-up:before{content:"\e113"}.glyphicon-chevron-down:before{content:"\e114"}.glyphicon-retweet:before{content:"\e115"}.glyphicon-shopping-cart:before{content:"\e116"}.glyphicon-folder-close:before{content:"\e117"}.glyphicon-folder-open:before{content:"\e118"}.glyphicon-resize-vertical:before{content:"\e119"}.glyphicon-resize-horizontal:before{content:"\e120"}.glyphicon-hdd:before{content:"\e121"}.glyphicon-bullhorn:before{content:"\e122"}.glyphicon-bell:before{content:"\e123"}.glyphicon-certificate:before{content:"\e124"}.glyphicon-thumbs-up:before{content:"\e125"}.glyphicon-thumbs-down:before{content:"\e126"}.glyphicon-hand-right:before{content:"\e127"}.glyphicon-hand-left:before{content:"\e128"}.glyphicon-hand-up:before{content:"\e129"}.glyphicon-hand-down:before{content:"\e130"}.glyphicon-circle-arrow-right:before{content:"\e131"}.glyphicon-circle-arrow-left:before{content:"\e132"}.glyphicon-circle-arrow-up:before{content:"\e133"}.glyphicon-circle-arrow-down:before{content:"\e134"}.glyphicon-globe:before{content:"\e135"}.glyphicon-wrench:before{content:"\e136"}.glyphicon-tasks:before{content:"\e137"}.glyphicon-filter:before{content:"\e138"}.glyphicon-briefcase:before{content:"\e139"}.glyphicon-fullscreen:before{content:"\e140"}.glyphicon-dashboard:before{content:"\e141"}.glyphicon-paperclip:before{content:"\e142"}.glyphicon-heart-empty:before{content:"\e143"}.glyphicon-link:before{content:"\e144"}.glyphicon-phone:before{content:"\e145"}.glyphicon-pushpin:before{content:"\e146"}.glyphicon-usd:before{content:"\e148"}.glyphicon-gbp:before{content:"\e149"}.glyphicon-sort:before{content:"\e150"}.glyphicon-sort-by-alphabet:before{content:"\e151"}.glyphicon-sort-by-alphabet-alt:before{content:"\e152"}.glyphicon-sort-by-order:before{content:"\e153"}.glyphicon-sort-by-order-alt:before{content:"\e154"}.glyphicon-sort-by-attributes:before{content:"\e155"}.glyphicon-sort-by-attributes-alt:before{content:"\e156"}.glyphicon-unchecked:before{content:"\e157"}.glyphicon-expand:before{content:"\e158"}.glyphicon-collapse-down:before{content:"\e159"}.glyphicon-collapse-up:before{content:"\e160"}.glyphicon-log-in:before{content:"\e161"}.glyphicon-flash:before{content:"\e162"}.glyphicon-log-out:before{content:"\e163"}.glyphicon-new-window:before{content:"\e164"}.glyphicon-record:before{content:"\e165"}.glyphicon-save:before{content:"\e166"}.glyphicon-open:before{content:"\e167"}.glyphicon-saved:before{content:"\e168"}.glyphicon-import:before{content:"\e169"}.glyphicon-export:before{content:"\e170"}.glyphicon-send:before{content:"\e171"}.glyphicon-floppy-disk:before{content:"\e172"}.glyphicon-floppy-saved:before{content:"\e173"}.glyphicon-floppy-remove:before{content:"\e174"}.glyphicon-floppy-save:before{content:"\e175"}.glyphicon-floppy-open:before{content:"\e176"}.glyphicon-credit-card:before{content:"\e177"}.glyphicon-transfer:before{content:"\e178"}.glyphicon-cutlery:before{content:"\e179"}.glyphicon-header:before{content:"\e180"}.glyphicon-compressed:before{content:"\e181"}.glyphicon-earphone:before{content:"\e182"}.glyphicon-phone-alt:before{content:"\e183"}.glyphicon-tower:before{content:"\e184"}.glyphicon-stats:before{content:"\e185"}.glyphicon-sd-video:before{content:"\e186"}.glyphicon-hd-video:before{content:"\e187"}.glyphicon-subtitles:before{content:"\e188"}.glyphicon-sound-stereo:before{content:"\e189"}.glyphicon-sound-dolby:before{content:"\e190"}.glyphicon-sound-5-1:before{content:"\e191"}.glyphicon-sound-6-1:before{content:"\e192"}.glyphicon-sound-7-1:before{content:"\e193"}.glyphicon-copyright-mark:before{content:"\e194"}.glyphicon-registration-mark:before{content:"\e195"}.glyphicon-cloud-download:before{content:"\e197"}.glyphicon-cloud-upload:before{content:"\e198"}.glyphicon-tree-conifer:before{content:"\e199"}.glyphicon-tree-deciduous:before{content:"\e200"}*{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}*:before,*:after{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}html{font-size:10px;-webkit-tap-highlight-color:rgba(0,0,0,0)}body{font-family:Georgia,"Times New Roman",Times,serif;font-size:16px;line-height:1.42857143;color:#333333;background-color:#ffffff}input,button,select,textarea{font-family:inherit;font-size:inherit;line-height:inherit}a{color:#4582ec;text-decoration:none}a:hover,a:focus{color:#134fb8;text-decoration:underline}a:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}figure{margin:0}img{vertical-align:middle}.img-responsive,.thumbnail>img,.thumbnail a>img,.carousel-inner>.item>img,.carousel-inner>.item>a>img{display:block;max-width:100%;height:auto}.img-rounded{border-radius:6px}.img-thumbnail{padding:4px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:all .2s ease-in-out;-o-transition:all .2s ease-in-out;transition:all .2s ease-in-out;display:inline-block;max-width:100%;height:auto}.img-circle{border-radius:50%}hr{margin-top:22px;margin-bottom:22px;border:0;border-top:1px solid #eeeeee}.sr-only{position:absolute;width:1px;height:1px;margin:-1px;padding:0;overflow:hidden;clip:rect(0, 0, 0, 0);border:0}.sr-only-focusable:active,.sr-only-focusable:focus{position:static;width:auto;height:auto;margin:0;overflow:visible;clip:auto}h1,h2,h3,h4,h5,h6,.h1,.h2,.h3,.h4,.h5,.h6{font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif;font-weight:bold;line-height:1.1;color:inherit}h1 small,h2 small,h3 small,h4 small,h5 small,h6 small,.h1 small,.h2 small,.h3 small,.h4 small,.h5 small,.h6 small,h1 .small,h2 .small,h3 .small,h4 .small,h5 .small,h6 .small,.h1 .small,.h2 .small,.h3 .small,.h4 .small,.h5 .small,.h6 .small{font-weight:normal;line-height:1;color:#b3b3b3}h1,.h1,h2,.h2,h3,.h3{margin-top:22px;margin-bottom:11px}h1 small,.h1 small,h2 small,.h2 small,h3 small,.h3 small,h1 .small,.h1 .small,h2 .small,.h2 .small,h3 .small,.h3 .small{font-size:65%}h4,.h4,h5,.h5,h6,.h6{margin-top:11px;margin-bottom:11px}h4 small,.h4 small,h5 small,.h5 small,h6 small,.h6 small,h4 .small,.h4 .small,h5 .small,.h5 .small,h6 .small,.h6 .small{font-size:75%}h1,.h1{font-size:41px}h2,.h2{font-size:34px}h3,.h3{font-size:28px}h4,.h4{font-size:20px}h5,.h5{font-size:16px}h6,.h6{font-size:14px}p{margin:0 0 11px}.lead{margin-bottom:22px;font-size:18px;font-weight:300;line-height:1.4}@media (min-width:768px){.lead{font-size:24px}}small,.small{font-size:87%}mark,.mark{background-color:#fcf8e3;padding:.2em}.text-left{text-align:left}.text-right{text-align:right}.text-center{text-align:center}.text-justify{text-align:justify}.text-nowrap{white-space:nowrap}.text-lowercase{text-transform:lowercase}.text-uppercase{text-transform:uppercase}.text-capitalize{text-transform:capitalize}.text-muted{color:#b3b3b3}.text-primary{color:#4582ec}a.text-primary:hover{color:#1863e6}.text-success{color:#3fad46}a.text-success:hover{color:#318837}.text-info{color:#5bc0de}a.text-info:hover{color:#31b0d5}.text-warning{color:#f0ad4e}a.text-warning:hover{color:#ec971f}.text-danger{color:#d9534f}a.text-danger:hover{color:#c9302c}.bg-primary{color:#fff;background-color:#4582ec}a.bg-primary:hover{background-color:#1863e6}.bg-success{background-color:#dff0d8}a.bg-success:hover{background-color:#c1e2b3}.bg-info{background-color:#d9edf7}a.bg-info:hover{background-color:#afd9ee}.bg-warning{background-color:#fcf8e3}a.bg-warning:hover{background-color:#f7ecb5}.bg-danger{background-color:#f2dede}a.bg-danger:hover{background-color:#e4b9b9}.page-header{padding-bottom:10px;margin:44px 0 22px;border-bottom:1px solid #dddddd}ul,ol{margin-top:0;margin-bottom:11px}ul ul,ol ul,ul ol,ol ol{margin-bottom:0}.list-unstyled{padding-left:0;list-style:none}.list-inline{padding-left:0;list-style:none;margin-left:-5px}.list-inline>li{display:inline-block;padding-left:5px;padding-right:5px}dl{margin-top:0;margin-bottom:22px}dt,dd{line-height:1.42857143}dt{font-weight:bold}dd{margin-left:0}@media (min-width:768px){.dl-horizontal dt{float:left;width:160px;clear:left;text-align:right;overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.dl-horizontal dd{margin-left:180px}}abbr[title],abbr[data-original-title]{cursor:help;border-bottom:1px dotted #b3b3b3}.initialism{font-size:90%;text-transform:uppercase}blockquote{padding:11px 22px;margin:0 0 22px;font-size:20px;border-left:5px solid #4582ec}blockquote p:last-child,blockquote ul:last-child,blockquote ol:last-child{margin-bottom:0}blockquote footer,blockquote small,blockquote .small{display:block;font-size:80%;line-height:1.42857143;color:#333333}blockquote footer:before,blockquote small:before,blockquote .small:before{content:'\2014 \00A0'}.blockquote-reverse,blockquote.pull-right{padding-right:15px;padding-left:0;border-right:5px solid #4582ec;border-left:0;text-align:right}.blockquote-reverse footer:before,blockquote.pull-right footer:before,.blockquote-reverse small:before,blockquote.pull-right small:before,.blockquote-reverse .small:before,blockquote.pull-right .small:before{content:''}.blockquote-reverse footer:after,blockquote.pull-right footer:after,.blockquote-reverse small:after,blockquote.pull-right small:after,.blockquote-reverse .small:after,blockquote.pull-right .small:after{content:'\00A0 \2014'}address{margin-bottom:22px;font-style:normal;line-height:1.42857143}code,kbd,pre,samp{font-family:monospace}code{padding:2px 4px;font-size:90%;color:#c7254e;background-color:#f9f2f4;border-radius:4px}kbd{padding:2px 4px;font-size:90%;color:#ffffff;background-color:#333333;border-radius:3px;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25)}kbd kbd{padding:0;font-size:100%;font-weight:bold;-webkit-box-shadow:none;box-shadow:none}pre{display:block;padding:10.5px;margin:0 0 11px;font-size:15px;line-height:1.42857143;word-break:break-all;word-wrap:break-word;color:#333333;background-color:#f5f5f5;border:1px solid #cccccc;border-radius:4px}pre code{padding:0;font-size:inherit;color:inherit;white-space:pre-wrap;background-color:transparent;border-radius:0}.pre-scrollable{max-height:340px;overflow-y:scroll}.container{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}@media (min-width:768px){.container{width:750px}}@media (min-width:992px){.container{width:970px}}@media (min-width:1200px){.container{width:1170px}}.container-fluid{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}.row{margin-left:-15px;margin-right:-15px}.col-xs-1,.col-sm-1,.col-md-1,.col-lg-1,.col-xs-2,.col-sm-2,.col-md-2,.col-lg-2,.col-xs-3,.col-sm-3,.col-md-3,.col-lg-3,.col-xs-4,.col-sm-4,.col-md-4,.col-lg-4,.col-xs-5,.col-sm-5,.col-md-5,.col-lg-5,.col-xs-6,.col-sm-6,.col-md-6,.col-lg-6,.col-xs-7,.col-sm-7,.col-md-7,.col-lg-7,.col-xs-8,.col-sm-8,.col-md-8,.col-lg-8,.col-xs-9,.col-sm-9,.col-md-9,.col-lg-9,.col-xs-10,.col-sm-10,.col-md-10,.col-lg-10,.col-xs-11,.col-sm-11,.col-md-11,.col-lg-11,.col-xs-12,.col-sm-12,.col-md-12,.col-lg-12{position:relative;min-height:1px;padding-left:15px;padding-right:15px}.col-xs-1,.col-xs-2,.col-xs-3,.col-xs-4,.col-xs-5,.col-xs-6,.col-xs-7,.col-xs-8,.col-xs-9,.col-xs-10,.col-xs-11,.col-xs-12{float:left}.col-xs-12{width:100%}.col-xs-11{width:91.66666667%}.col-xs-10{width:83.33333333%}.col-xs-9{width:75%}.col-xs-8{width:66.66666667%}.col-xs-7{width:58.33333333%}.col-xs-6{width:50%}.col-xs-5{width:41.66666667%}.col-xs-4{width:33.33333333%}.col-xs-3{width:25%}.col-xs-2{width:16.66666667%}.col-xs-1{width:8.33333333%}.col-xs-pull-12{right:100%}.col-xs-pull-11{right:91.66666667%}.col-xs-pull-10{right:83.33333333%}.col-xs-pull-9{right:75%}.col-xs-pull-8{right:66.66666667%}.col-xs-pull-7{right:58.33333333%}.col-xs-pull-6{right:50%}.col-xs-pull-5{right:41.66666667%}.col-xs-pull-4{right:33.33333333%}.col-xs-pull-3{right:25%}.col-xs-pull-2{right:16.66666667%}.col-xs-pull-1{right:8.33333333%}.col-xs-pull-0{right:auto}.col-xs-push-12{left:100%}.col-xs-push-11{left:91.66666667%}.col-xs-push-10{left:83.33333333%}.col-xs-push-9{left:75%}.col-xs-push-8{left:66.66666667%}.col-xs-push-7{left:58.33333333%}.col-xs-push-6{left:50%}.col-xs-push-5{left:41.66666667%}.col-xs-push-4{left:33.33333333%}.col-xs-push-3{left:25%}.col-xs-push-2{left:16.66666667%}.col-xs-push-1{left:8.33333333%}.col-xs-push-0{left:auto}.col-xs-offset-12{margin-left:100%}.col-xs-offset-11{margin-left:91.66666667%}.col-xs-offset-10{margin-left:83.33333333%}.col-xs-offset-9{margin-left:75%}.col-xs-offset-8{margin-left:66.66666667%}.col-xs-offset-7{margin-left:58.33333333%}.col-xs-offset-6{margin-left:50%}.col-xs-offset-5{margin-left:41.66666667%}.col-xs-offset-4{margin-left:33.33333333%}.col-xs-offset-3{margin-left:25%}.col-xs-offset-2{margin-left:16.66666667%}.col-xs-offset-1{margin-left:8.33333333%}.col-xs-offset-0{margin-left:0%}@media (min-width:768px){.col-sm-1,.col-sm-2,.col-sm-3,.col-sm-4,.col-sm-5,.col-sm-6,.col-sm-7,.col-sm-8,.col-sm-9,.col-sm-10,.col-sm-11,.col-sm-12{float:left}.col-sm-12{width:100%}.col-sm-11{width:91.66666667%}.col-sm-10{width:83.33333333%}.col-sm-9{width:75%}.col-sm-8{width:66.66666667%}.col-sm-7{width:58.33333333%}.col-sm-6{width:50%}.col-sm-5{width:41.66666667%}.col-sm-4{width:33.33333333%}.col-sm-3{width:25%}.col-sm-2{width:16.66666667%}.col-sm-1{width:8.33333333%}.col-sm-pull-12{right:100%}.col-sm-pull-11{right:91.66666667%}.col-sm-pull-10{right:83.33333333%}.col-sm-pull-9{right:75%}.col-sm-pull-8{right:66.66666667%}.col-sm-pull-7{right:58.33333333%}.col-sm-pull-6{right:50%}.col-sm-pull-5{right:41.66666667%}.col-sm-pull-4{right:33.33333333%}.col-sm-pull-3{right:25%}.col-sm-pull-2{right:16.66666667%}.col-sm-pull-1{right:8.33333333%}.col-sm-pull-0{right:auto}.col-sm-push-12{left:100%}.col-sm-push-11{left:91.66666667%}.col-sm-push-10{left:83.33333333%}.col-sm-push-9{left:75%}.col-sm-push-8{left:66.66666667%}.col-sm-push-7{left:58.33333333%}.col-sm-push-6{left:50%}.col-sm-push-5{left:41.66666667%}.col-sm-push-4{left:33.33333333%}.col-sm-push-3{left:25%}.col-sm-push-2{left:16.66666667%}.col-sm-push-1{left:8.33333333%}.col-sm-push-0{left:auto}.col-sm-offset-12{margin-left:100%}.col-sm-offset-11{margin-left:91.66666667%}.col-sm-offset-10{margin-left:83.33333333%}.col-sm-offset-9{margin-left:75%}.col-sm-offset-8{margin-left:66.66666667%}.col-sm-offset-7{margin-left:58.33333333%}.col-sm-offset-6{margin-left:50%}.col-sm-offset-5{margin-left:41.66666667%}.col-sm-offset-4{margin-left:33.33333333%}.col-sm-offset-3{margin-left:25%}.col-sm-offset-2{margin-left:16.66666667%}.col-sm-offset-1{margin-left:8.33333333%}.col-sm-offset-0{margin-left:0%}}@media (min-width:992px){.col-md-1,.col-md-2,.col-md-3,.col-md-4,.col-md-5,.col-md-6,.col-md-7,.col-md-8,.col-md-9,.col-md-10,.col-md-11,.col-md-12{float:left}.col-md-12{width:100%}.col-md-11{width:91.66666667%}.col-md-10{width:83.33333333%}.col-md-9{width:75%}.col-md-8{width:66.66666667%}.col-md-7{width:58.33333333%}.col-md-6{width:50%}.col-md-5{width:41.66666667%}.col-md-4{width:33.33333333%}.col-md-3{width:25%}.col-md-2{width:16.66666667%}.col-md-1{width:8.33333333%}.col-md-pull-12{right:100%}.col-md-pull-11{right:91.66666667%}.col-md-pull-10{right:83.33333333%}.col-md-pull-9{right:75%}.col-md-pull-8{right:66.66666667%}.col-md-pull-7{right:58.33333333%}.col-md-pull-6{right:50%}.col-md-pull-5{right:41.66666667%}.col-md-pull-4{right:33.33333333%}.col-md-pull-3{right:25%}.col-md-pull-2{right:16.66666667%}.col-md-pull-1{right:8.33333333%}.col-md-pull-0{right:auto}.col-md-push-12{left:100%}.col-md-push-11{left:91.66666667%}.col-md-push-10{left:83.33333333%}.col-md-push-9{left:75%}.col-md-push-8{left:66.66666667%}.col-md-push-7{left:58.33333333%}.col-md-push-6{left:50%}.col-md-push-5{left:41.66666667%}.col-md-push-4{left:33.33333333%}.col-md-push-3{left:25%}.col-md-push-2{left:16.66666667%}.col-md-push-1{left:8.33333333%}.col-md-push-0{left:auto}.col-md-offset-12{margin-left:100%}.col-md-offset-11{margin-left:91.66666667%}.col-md-offset-10{margin-left:83.33333333%}.col-md-offset-9{margin-left:75%}.col-md-offset-8{margin-left:66.66666667%}.col-md-offset-7{margin-left:58.33333333%}.col-md-offset-6{margin-left:50%}.col-md-offset-5{margin-left:41.66666667%}.col-md-offset-4{margin-left:33.33333333%}.col-md-offset-3{margin-left:25%}.col-md-offset-2{margin-left:16.66666667%}.col-md-offset-1{margin-left:8.33333333%}.col-md-offset-0{margin-left:0%}}@media (min-width:1200px){.col-lg-1,.col-lg-2,.col-lg-3,.col-lg-4,.col-lg-5,.col-lg-6,.col-lg-7,.col-lg-8,.col-lg-9,.col-lg-10,.col-lg-11,.col-lg-12{float:left}.col-lg-12{width:100%}.col-lg-11{width:91.66666667%}.col-lg-10{width:83.33333333%}.col-lg-9{width:75%}.col-lg-8{width:66.66666667%}.col-lg-7{width:58.33333333%}.col-lg-6{width:50%}.col-lg-5{width:41.66666667%}.col-lg-4{width:33.33333333%}.col-lg-3{width:25%}.col-lg-2{width:16.66666667%}.col-lg-1{width:8.33333333%}.col-lg-pull-12{right:100%}.col-lg-pull-11{right:91.66666667%}.col-lg-pull-10{right:83.33333333%}.col-lg-pull-9{right:75%}.col-lg-pull-8{right:66.66666667%}.col-lg-pull-7{right:58.33333333%}.col-lg-pull-6{right:50%}.col-lg-pull-5{right:41.66666667%}.col-lg-pull-4{right:33.33333333%}.col-lg-pull-3{right:25%}.col-lg-pull-2{right:16.66666667%}.col-lg-pull-1{right:8.33333333%}.col-lg-pull-0{right:auto}.col-lg-push-12{left:100%}.col-lg-push-11{left:91.66666667%}.col-lg-push-10{left:83.33333333%}.col-lg-push-9{left:75%}.col-lg-push-8{left:66.66666667%}.col-lg-push-7{left:58.33333333%}.col-lg-push-6{left:50%}.col-lg-push-5{left:41.66666667%}.col-lg-push-4{left:33.33333333%}.col-lg-push-3{left:25%}.col-lg-push-2{left:16.66666667%}.col-lg-push-1{left:8.33333333%}.col-lg-push-0{left:auto}.col-lg-offset-12{margin-left:100%}.col-lg-offset-11{margin-left:91.66666667%}.col-lg-offset-10{margin-left:83.33333333%}.col-lg-offset-9{margin-left:75%}.col-lg-offset-8{margin-left:66.66666667%}.col-lg-offset-7{margin-left:58.33333333%}.col-lg-offset-6{margin-left:50%}.col-lg-offset-5{margin-left:41.66666667%}.col-lg-offset-4{margin-left:33.33333333%}.col-lg-offset-3{margin-left:25%}.col-lg-offset-2{margin-left:16.66666667%}.col-lg-offset-1{margin-left:8.33333333%}.col-lg-offset-0{margin-left:0%}}table{background-color:transparent}caption{padding-top:8px;padding-bottom:8px;color:#b3b3b3;text-align:left}th{}.table{width:100%;max-width:100%;margin-bottom:22px}.table>thead>tr>th,.table>tbody>tr>th,.table>tfoot>tr>th,.table>thead>tr>td,.table>tbody>tr>td,.table>tfoot>tr>td{padding:8px;line-height:1.42857143;vertical-align:top;border-top:1px solid #dddddd}.table>thead>tr>th{vertical-align:bottom;border-bottom:2px solid #dddddd}.table>caption+thead>tr:first-child>th,.table>colgroup+thead>tr:first-child>th,.table>thead:first-child>tr:first-child>th,.table>caption+thead>tr:first-child>td,.table>colgroup+thead>tr:first-child>td,.table>thead:first-child>tr:first-child>td{border-top:0}.table>tbody+tbody{border-top:2px solid #dddddd}.table .table{background-color:#ffffff}.table-condensed>thead>tr>th,.table-condensed>tbody>tr>th,.table-condensed>tfoot>tr>th,.table-condensed>thead>tr>td,.table-condensed>tbody>tr>td,.table-condensed>tfoot>tr>td{padding:5px}.table-bordered{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>tbody>tr>th,.table-bordered>tfoot>tr>th,.table-bordered>thead>tr>td,.table-bordered>tbody>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>thead>tr>td{border-bottom-width:2px}.table-striped>tbody>tr:nth-child(odd){background-color:#f9f9f9}.table-hover>tbody>tr:hover{background-color:#f5f5f5}table col[class*="col-"]{position:static;float:none;display:table-column}table td[class*="col-"],table th[class*="col-"]{position:static;float:none;display:table-cell}.table>thead>tr>td.active,.table>tbody>tr>td.active,.table>tfoot>tr>td.active,.table>thead>tr>th.active,.table>tbody>tr>th.active,.table>tfoot>tr>th.active,.table>thead>tr.active>td,.table>tbody>tr.active>td,.table>tfoot>tr.active>td,.table>thead>tr.active>th,.table>tbody>tr.active>th,.table>tfoot>tr.active>th{background-color:#f5f5f5}.table-hover>tbody>tr>td.active:hover,.table-hover>tbody>tr>th.active:hover,.table-hover>tbody>tr.active:hover>td,.table-hover>tbody>tr:hover>.active,.table-hover>tbody>tr.active:hover>th{background-color:#e8e8e8}.table>thead>tr>td.success,.table>tbody>tr>td.success,.table>tfoot>tr>td.success,.table>thead>tr>th.success,.table>tbody>tr>th.success,.table>tfoot>tr>th.success,.table>thead>tr.success>td,.table>tbody>tr.success>td,.table>tfoot>tr.success>td,.table>thead>tr.success>th,.table>tbody>tr.success>th,.table>tfoot>tr.success>th{background-color:#dff0d8}.table-hover>tbody>tr>td.success:hover,.table-hover>tbody>tr>th.success:hover,.table-hover>tbody>tr.success:hover>td,.table-hover>tbody>tr:hover>.success,.table-hover>tbody>tr.success:hover>th{background-color:#d0e9c6}.table>thead>tr>td.info,.table>tbody>tr>td.info,.table>tfoot>tr>td.info,.table>thead>tr>th.info,.table>tbody>tr>th.info,.table>tfoot>tr>th.info,.table>thead>tr.info>td,.table>tbody>tr.info>td,.table>tfoot>tr.info>td,.table>thead>tr.info>th,.table>tbody>tr.info>th,.table>tfoot>tr.info>th{background-color:#d9edf7}.table-hover>tbody>tr>td.info:hover,.table-hover>tbody>tr>th.info:hover,.table-hover>tbody>tr.info:hover>td,.table-hover>tbody>tr:hover>.info,.table-hover>tbody>tr.info:hover>th{background-color:#c4e3f3}.table>thead>tr>td.warning,.table>tbody>tr>td.warning,.table>tfoot>tr>td.warning,.table>thead>tr>th.warning,.table>tbody>tr>th.warning,.table>tfoot>tr>th.warning,.table>thead>tr.warning>td,.table>tbody>tr.warning>td,.table>tfoot>tr.warning>td,.table>thead>tr.warning>th,.table>tbody>tr.warning>th,.table>tfoot>tr.warning>th{background-color:#fcf8e3}.table-hover>tbody>tr>td.warning:hover,.table-hover>tbody>tr>th.warning:hover,.table-hover>tbody>tr.warning:hover>td,.table-hover>tbody>tr:hover>.warning,.table-hover>tbody>tr.warning:hover>th{background-color:#faf2cc}.table>thead>tr>td.danger,.table>tbody>tr>td.danger,.table>tfoot>tr>td.danger,.table>thead>tr>th.danger,.table>tbody>tr>th.danger,.table>tfoot>tr>th.danger,.table>thead>tr.danger>td,.table>tbody>tr.danger>td,.table>tfoot>tr.danger>td,.table>thead>tr.danger>th,.table>tbody>tr.danger>th,.table>tfoot>tr.danger>th{background-color:#f2dede}.table-hover>tbody>tr>td.danger:hover,.table-hover>tbody>tr>th.danger:hover,.table-hover>tbody>tr.danger:hover>td,.table-hover>tbody>tr:hover>.danger,.table-hover>tbody>tr.danger:hover>th{background-color:#ebcccc}.table-responsive{overflow-x:auto;min-height:0.01%}@media screen and (max-width:767px){.table-responsive{width:100%;margin-bottom:16.5px;overflow-y:hidden;-ms-overflow-style:-ms-autohiding-scrollbar;border:1px solid #dddddd}.table-responsive>.table{margin-bottom:0}.table-responsive>.table>thead>tr>th,.table-responsive>.table>tbody>tr>th,.table-responsive>.table>tfoot>tr>th,.table-responsive>.table>thead>tr>td,.table-responsive>.table>tbody>tr>td,.table-responsive>.table>tfoot>tr>td{white-space:nowrap}.table-responsive>.table-bordered{border:0}.table-responsive>.table-bordered>thead>tr>th:first-child,.table-responsive>.table-bordered>tbody>tr>th:first-child,.table-responsive>.table-bordered>tfoot>tr>th:first-child,.table-responsive>.table-bordered>thead>tr>td:first-child,.table-responsive>.table-bordered>tbody>tr>td:first-child,.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.table-responsive>.table-bordered>thead>tr>th:last-child,.table-responsive>.table-bordered>tbody>tr>th:last-child,.table-responsive>.table-bordered>tfoot>tr>th:last-child,.table-responsive>.table-bordered>thead>tr>td:last-child,.table-responsive>.table-bordered>tbody>tr>td:last-child,.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.table-responsive>.table-bordered>tbody>tr:last-child>th,.table-responsive>.table-bordered>tfoot>tr:last-child>th,.table-responsive>.table-bordered>tbody>tr:last-child>td,.table-responsive>.table-bordered>tfoot>tr:last-child>td{border-bottom:0}}fieldset{padding:0;margin:0;border:0;min-width:0}legend{display:block;width:100%;padding:0;margin-bottom:22px;font-size:24px;line-height:inherit;color:#333333;border:0;border-bottom:1px solid #e5e5e5}label{display:inline-block;max-width:100%;margin-bottom:5px;font-weight:bold}input[type="search"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}input[type="radio"],input[type="checkbox"]{margin:4px 0 0;margin-top:1px \9;line-height:normal}input[type="file"]{display:block}input[type="range"]{display:block;width:100%}select[multiple],select[size]{height:auto}input[type="file"]:focus,input[type="radio"]:focus,input[type="checkbox"]:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}output{display:block;padding-top:9px;font-size:16px;line-height:1.42857143;color:#333333}.form-control{display:block;width:100%;height:40px;padding:8px 12px;font-size:16px;line-height:1.42857143;color:#333333;background-color:#ffffff;background-image:none;border:1px solid #dddddd;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);-webkit-transition:border-color ease-in-out .15s,-webkit-box-shadow ease-in-out .15s;-o-transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s;transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s}.form-control:focus{border-color:#66afe9;outline:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6)}.form-control::-moz-placeholder{color:#b3b3b3;opacity:1}.form-control:-ms-input-placeholder{color:#b3b3b3}.form-control::-webkit-input-placeholder{color:#b3b3b3}.form-control[disabled],.form-control[readonly],fieldset[disabled] .form-control{cursor:not-allowed;background-color:#eeeeee;opacity:1}textarea.form-control{height:auto}input[type="search"]{-webkit-appearance:none}@media screen and (-webkit-min-device-pixel-ratio:0){input[type="date"],input[type="time"],input[type="datetime-local"],input[type="month"]{line-height:40px}input[type="date"].input-sm,input[type="time"].input-sm,input[type="datetime-local"].input-sm,input[type="month"].input-sm{line-height:33px}input[type="date"].input-lg,input[type="time"].input-lg,input[type="datetime-local"].input-lg,input[type="month"].input-lg{line-height:57px}}.form-group{margin-bottom:15px}.radio,.checkbox{position:relative;display:block;margin-top:10px;margin-bottom:10px}.radio label,.checkbox label{min-height:22px;padding-left:20px;margin-bottom:0;font-weight:normal;cursor:pointer}.radio input[type="radio"],.radio-inline input[type="radio"],.checkbox input[type="checkbox"],.checkbox-inline input[type="checkbox"]{position:absolute;margin-left:-20px;margin-top:4px \9}.radio+.radio,.checkbox+.checkbox{margin-top:-5px}.radio-inline,.checkbox-inline{display:inline-block;padding-left:20px;margin-bottom:0;vertical-align:middle;font-weight:normal;cursor:pointer}.radio-inline+.radio-inline,.checkbox-inline+.checkbox-inline{margin-top:0;margin-left:10px}input[type="radio"][disabled],input[type="checkbox"][disabled],input[type="radio"].disabled,input[type="checkbox"].disabled,fieldset[disabled] input[type="radio"],fieldset[disabled] input[type="checkbox"]{cursor:not-allowed}.radio-inline.disabled,.checkbox-inline.disabled,fieldset[disabled] .radio-inline,fieldset[disabled] .checkbox-inline{cursor:not-allowed}.radio.disabled label,.checkbox.disabled label,fieldset[disabled] .radio label,fieldset[disabled] .checkbox label{cursor:not-allowed}.form-control-static{padding-top:9px;padding-bottom:9px;margin-bottom:0}.form-control-static.input-lg,.form-control-static.input-sm{padding-left:0;padding-right:0}.input-sm,.form-group-sm .form-control{height:33px;padding:5px 10px;font-size:14px;line-height:1.5;border-radius:3px}select.input-sm,select.form-group-sm .form-control{height:33px;line-height:33px}textarea.input-sm,textarea.form-group-sm .form-control,select[multiple].input-sm,select[multiple].form-group-sm .form-control{height:auto}.input-lg,.form-group-lg .form-control{height:57px;padding:14px 16px;font-size:20px;line-height:1.33;border-radius:6px}select.input-lg,select.form-group-lg .form-control{height:57px;line-height:57px}textarea.input-lg,textarea.form-group-lg .form-control,select[multiple].input-lg,select[multiple].form-group-lg .form-control{height:auto}.has-feedback{position:relative}.has-feedback .form-control{padding-right:50px}.form-control-feedback{position:absolute;top:0;right:0;z-index:2;display:block;width:40px;height:40px;line-height:40px;text-align:center;pointer-events:none}.input-lg+.form-control-feedback{width:57px;height:57px;line-height:57px}.input-sm+.form-control-feedback{width:33px;height:33px;line-height:33px}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success.radio label,.has-success.checkbox label,.has-success.radio-inline label,.has-success.checkbox-inline label{color:#3fad46}.has-success .form-control{border-color:#3fad46;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-success .form-control:focus{border-color:#318837;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #81d186;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #81d186}.has-success .input-group-addon{color:#3fad46;border-color:#3fad46;background-color:#dff0d8}.has-success .form-control-feedback{color:#3fad46}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning.radio label,.has-warning.checkbox label,.has-warning.radio-inline label,.has-warning.checkbox-inline label{color:#f0ad4e}.has-warning .form-control{border-color:#f0ad4e;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-warning .form-control:focus{border-color:#ec971f;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #f8d9ac;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #f8d9ac}.has-warning .input-group-addon{color:#f0ad4e;border-color:#f0ad4e;background-color:#fcf8e3}.has-warning .form-control-feedback{color:#f0ad4e}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error.radio label,.has-error.checkbox label,.has-error.radio-inline label,.has-error.checkbox-inline label{color:#d9534f}.has-error .form-control{border-color:#d9534f;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-error .form-control:focus{border-color:#c9302c;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #eba5a3;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #eba5a3}.has-error .input-group-addon{color:#d9534f;border-color:#d9534f;background-color:#f2dede}.has-error .form-control-feedback{color:#d9534f}.has-feedback label~.form-control-feedback{top:27px}.has-feedback label.sr-only~.form-control-feedback{top:0}.help-block{display:block;margin-top:5px;margin-bottom:10px;color:#737373}@media (min-width:768px){.form-inline .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.form-inline .form-control{display:inline-block;width:auto;vertical-align:middle}.form-inline .form-control-static{display:inline-block}.form-inline .input-group{display:inline-table;vertical-align:middle}.form-inline .input-group .input-group-addon,.form-inline .input-group .input-group-btn,.form-inline .input-group .form-control{width:auto}.form-inline .input-group>.form-control{width:100%}.form-inline .control-label{margin-bottom:0;vertical-align:middle}.form-inline .radio,.form-inline .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.form-inline .radio label,.form-inline .checkbox label{padding-left:0}.form-inline .radio input[type="radio"],.form-inline .checkbox input[type="checkbox"]{position:relative;margin-left:0}.form-inline .has-feedback .form-control-feedback{top:0}}.form-horizontal .radio,.form-horizontal .checkbox,.form-horizontal .radio-inline,.form-horizontal .checkbox-inline{margin-top:0;margin-bottom:0;padding-top:9px}.form-horizontal .radio,.form-horizontal .checkbox{min-height:31px}.form-horizontal .form-group{margin-left:-15px;margin-right:-15px}@media (min-width:768px){.form-horizontal .control-label{text-align:right;margin-bottom:0;padding-top:9px}}.form-horizontal .has-feedback .form-control-feedback{right:15px}@media (min-width:768px){.form-horizontal .form-group-lg .control-label{padding-top:19.62px}}@media (min-width:768px){.form-horizontal .form-group-sm .control-label{padding-top:6px}}.btn{display:inline-block;margin-bottom:0;font-weight:normal;text-align:center;vertical-align:middle;-ms-touch-action:manipulation;touch-action:manipulation;cursor:pointer;background-image:none;border:1px solid transparent;white-space:nowrap;padding:8px 12px;font-size:16px;line-height:1.42857143;border-radius:4px;-webkit-user-select:none;-moz-user-select:none;-ms-user-select:none;user-select:none}.btn:focus,.btn:active:focus,.btn.active:focus,.btn.focus,.btn:active.focus,.btn.active.focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}.btn:hover,.btn:focus,.btn.focus{color:#333333;text-decoration:none}.btn:active,.btn.active{outline:0;background-image:none;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn.disabled,.btn[disabled],fieldset[disabled] .btn{cursor:not-allowed;pointer-events:none;opacity:0.65;filter:alpha(opacity=65);-webkit-box-shadow:none;box-shadow:none}.btn-default{color:#333333;background-color:#ffffff;border-color:#dddddd}.btn-default:hover,.btn-default:focus,.btn-default.focus,.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{color:#333333;background-color:#e6e6e6;border-color:#bebebe}.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{background-image:none}.btn-default.disabled,.btn-default[disabled],fieldset[disabled] .btn-default,.btn-default.disabled:hover,.btn-default[disabled]:hover,fieldset[disabled] .btn-default:hover,.btn-default.disabled:focus,.btn-default[disabled]:focus,fieldset[disabled] .btn-default:focus,.btn-default.disabled.focus,.btn-default[disabled].focus,fieldset[disabled] .btn-default.focus,.btn-default.disabled:active,.btn-default[disabled]:active,fieldset[disabled] .btn-default:active,.btn-default.disabled.active,.btn-default[disabled].active,fieldset[disabled] .btn-default.active{background-color:#ffffff;border-color:#dddddd}.btn-default .badge{color:#ffffff;background-color:#333333}.btn-primary{color:#ffffff;background-color:#4582ec;border-color:#4582ec}.btn-primary:hover,.btn-primary:focus,.btn-primary.focus,.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{color:#ffffff;background-color:#1863e6;border-color:#175fdd}.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{background-image:none}.btn-primary.disabled,.btn-primary[disabled],fieldset[disabled] .btn-primary,.btn-primary.disabled:hover,.btn-primary[disabled]:hover,fieldset[disabled] .btn-primary:hover,.btn-primary.disabled:focus,.btn-primary[disabled]:focus,fieldset[disabled] .btn-primary:focus,.btn-primary.disabled.focus,.btn-primary[disabled].focus,fieldset[disabled] .btn-primary.focus,.btn-primary.disabled:active,.btn-primary[disabled]:active,fieldset[disabled] .btn-primary:active,.btn-primary.disabled.active,.btn-primary[disabled].active,fieldset[disabled] .btn-primary.active{background-color:#4582ec;border-color:#4582ec}.btn-primary .badge{color:#4582ec;background-color:#ffffff}.btn-success{color:#ffffff;background-color:#3fad46;border-color:#3fad46}.btn-success:hover,.btn-success:focus,.btn-success.focus,.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{color:#ffffff;background-color:#318837;border-color:#2f8034}.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{background-image:none}.btn-success.disabled,.btn-success[disabled],fieldset[disabled] .btn-success,.btn-success.disabled:hover,.btn-success[disabled]:hover,fieldset[disabled] .btn-success:hover,.btn-success.disabled:focus,.btn-success[disabled]:focus,fieldset[disabled] .btn-success:focus,.btn-success.disabled.focus,.btn-success[disabled].focus,fieldset[disabled] .btn-success.focus,.btn-success.disabled:active,.btn-success[disabled]:active,fieldset[disabled] .btn-success:active,.btn-success.disabled.active,.btn-success[disabled].active,fieldset[disabled] .btn-success.active{background-color:#3fad46;border-color:#3fad46}.btn-success .badge{color:#3fad46;background-color:#ffffff}.btn-info{color:#ffffff;background-color:#5bc0de;border-color:#5bc0de}.btn-info:hover,.btn-info:focus,.btn-info.focus,.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{color:#ffffff;background-color:#31b0d5;border-color:#2aabd2}.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{background-image:none}.btn-info.disabled,.btn-info[disabled],fieldset[disabled] .btn-info,.btn-info.disabled:hover,.btn-info[disabled]:hover,fieldset[disabled] .btn-info:hover,.btn-info.disabled:focus,.btn-info[disabled]:focus,fieldset[disabled] .btn-info:focus,.btn-info.disabled.focus,.btn-info[disabled].focus,fieldset[disabled] .btn-info.focus,.btn-info.disabled:active,.btn-info[disabled]:active,fieldset[disabled] .btn-info:active,.btn-info.disabled.active,.btn-info[disabled].active,fieldset[disabled] .btn-info.active{background-color:#5bc0de;border-color:#5bc0de}.btn-info .badge{color:#5bc0de;background-color:#ffffff}.btn-warning{color:#ffffff;background-color:#f0ad4e;border-color:#f0ad4e}.btn-warning:hover,.btn-warning:focus,.btn-warning.focus,.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{color:#ffffff;background-color:#ec971f;border-color:#eb9316}.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{background-image:none}.btn-warning.disabled,.btn-warning[disabled],fieldset[disabled] .btn-warning,.btn-warning.disabled:hover,.btn-warning[disabled]:hover,fieldset[disabled] .btn-warning:hover,.btn-warning.disabled:focus,.btn-warning[disabled]:focus,fieldset[disabled] .btn-warning:focus,.btn-warning.disabled.focus,.btn-warning[disabled].focus,fieldset[disabled] .btn-warning.focus,.btn-warning.disabled:active,.btn-warning[disabled]:active,fieldset[disabled] .btn-warning:active,.btn-warning.disabled.active,.btn-warning[disabled].active,fieldset[disabled] .btn-warning.active{background-color:#f0ad4e;border-color:#f0ad4e}.btn-warning .badge{color:#f0ad4e;background-color:#ffffff}.btn-danger{color:#ffffff;background-color:#d9534f;border-color:#d9534f}.btn-danger:hover,.btn-danger:focus,.btn-danger.focus,.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{color:#ffffff;background-color:#c9302c;border-color:#c12e2a}.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{background-image:none}.btn-danger.disabled,.btn-danger[disabled],fieldset[disabled] .btn-danger,.btn-danger.disabled:hover,.btn-danger[disabled]:hover,fieldset[disabled] .btn-danger:hover,.btn-danger.disabled:focus,.btn-danger[disabled]:focus,fieldset[disabled] .btn-danger:focus,.btn-danger.disabled.focus,.btn-danger[disabled].focus,fieldset[disabled] .btn-danger.focus,.btn-danger.disabled:active,.btn-danger[disabled]:active,fieldset[disabled] .btn-danger:active,.btn-danger.disabled.active,.btn-danger[disabled].active,fieldset[disabled] .btn-danger.active{background-color:#d9534f;border-color:#d9534f}.btn-danger .badge{color:#d9534f;background-color:#ffffff}.btn-link{color:#4582ec;font-weight:normal;border-radius:0}.btn-link,.btn-link:active,.btn-link.active,.btn-link[disabled],fieldset[disabled] .btn-link{background-color:transparent;-webkit-box-shadow:none;box-shadow:none}.btn-link,.btn-link:hover,.btn-link:focus,.btn-link:active{border-color:transparent}.btn-link:hover,.btn-link:focus{color:#134fb8;text-decoration:underline;background-color:transparent}.btn-link[disabled]:hover,fieldset[disabled] .btn-link:hover,.btn-link[disabled]:focus,fieldset[disabled] .btn-link:focus{color:#b3b3b3;text-decoration:none}.btn-lg,.btn-group-lg>.btn{padding:14px 16px;font-size:20px;line-height:1.33;border-radius:6px}.btn-sm,.btn-group-sm>.btn{padding:5px 10px;font-size:14px;line-height:1.5;border-radius:3px}.btn-xs,.btn-group-xs>.btn{padding:1px 5px;font-size:14px;line-height:1.5;border-radius:3px}.btn-block{display:block;width:100%}.btn-block+.btn-block{margin-top:5px}input[type="submit"].btn-block,input[type="reset"].btn-block,input[type="button"].btn-block{width:100%}.fade{opacity:0;-webkit-transition:opacity 0.15s linear;-o-transition:opacity 0.15s linear;transition:opacity 0.15s linear}.fade.in{opacity:1}.collapse{display:none;visibility:hidden}.collapse.in{display:block;visibility:visible}tr.collapse.in{display:table-row}tbody.collapse.in{display:table-row-group}.collapsing{position:relative;height:0;overflow:hidden;-webkit-transition-property:height, visibility;-o-transition-property:height, visibility;transition-property:height, visibility;-webkit-transition-duration:0.35s;-o-transition-duration:0.35s;transition-duration:0.35s;-webkit-transition-timing-function:ease;-o-transition-timing-function:ease;transition-timing-function:ease}.caret{display:inline-block;width:0;height:0;margin-left:2px;vertical-align:middle;border-top:4px solid;border-right:4px solid transparent;border-left:4px solid transparent}.dropdown{position:relative}.dropdown-toggle:focus{outline:0}.dropdown-menu{position:absolute;top:100%;left:0;z-index:1000;display:none;float:left;min-width:160px;padding:5px 0;margin:2px 0 0;list-style:none;font-size:16px;text-align:left;background-color:#ffffff;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.15);border-radius:4px;-webkit-box-shadow:0 6px 12px rgba(0,0,0,0.175);box-shadow:0 6px 12px rgba(0,0,0,0.175);-webkit-background-clip:padding-box;background-clip:padding-box}.dropdown-menu.pull-right{right:0;left:auto}.dropdown-menu .divider{height:1px;margin:10px 0;overflow:hidden;background-color:#e5e5e5}.dropdown-menu>li>a{display:block;padding:3px 20px;clear:both;font-weight:normal;line-height:1.42857143;color:#333333;white-space:nowrap}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{text-decoration:none;color:#ffffff;background-color:#4582ec}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{color:#ffffff;text-decoration:none;outline:0;background-color:#4582ec}.dropdown-menu>.disabled>a,.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{color:#b3b3b3}.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{text-decoration:none;background-color:transparent;background-image:none;filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);cursor:not-allowed}.open>.dropdown-menu{display:block}.open>a{outline:0}.dropdown-menu-right{left:auto;right:0}.dropdown-menu-left{left:0;right:auto}.dropdown-header{display:block;padding:3px 20px;font-size:14px;line-height:1.42857143;color:#b3b3b3;white-space:nowrap}.dropdown-backdrop{position:fixed;left:0;right:0;bottom:0;top:0;z-index:990}.pull-right>.dropdown-menu{right:0;left:auto}.dropup .caret,.navbar-fixed-bottom .dropdown .caret{border-top:0;border-bottom:4px solid;content:""}.dropup .dropdown-menu,.navbar-fixed-bottom .dropdown .dropdown-menu{top:auto;bottom:100%;margin-bottom:1px}@media (min-width:768px){.navbar-right .dropdown-menu{left:auto;right:0}.navbar-right .dropdown-menu-left{left:0;right:auto}}.btn-group,.btn-group-vertical{position:relative;display:inline-block;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;float:left}.btn-group>.btn:hover,.btn-group-vertical>.btn:hover,.btn-group>.btn:focus,.btn-group-vertical>.btn:focus,.btn-group>.btn:active,.btn-group-vertical>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn.active{z-index:2}.btn-group .btn+.btn,.btn-group .btn+.btn-group,.btn-group .btn-group+.btn,.btn-group .btn-group+.btn-group{margin-left:-1px}.btn-toolbar{margin-left:-5px}.btn-toolbar .btn-group,.btn-toolbar .input-group{float:left}.btn-toolbar>.btn,.btn-toolbar>.btn-group,.btn-toolbar>.input-group{margin-left:5px}.btn-group>.btn:not(:first-child):not(:last-child):not(.dropdown-toggle){border-radius:0}.btn-group>.btn:first-child{margin-left:0}.btn-group>.btn:first-child:not(:last-child):not(.dropdown-toggle){border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn:last-child:not(:first-child),.btn-group>.dropdown-toggle:not(:first-child){border-bottom-left-radius:0;border-top-left-radius:0}.btn-group>.btn-group{float:left}.btn-group>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group>.btn-group:first-child>.btn:last-child,.btn-group>.btn-group:first-child>.dropdown-toggle{border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn-group:last-child>.btn:first-child{border-bottom-left-radius:0;border-top-left-radius:0}.btn-group .dropdown-toggle:active,.btn-group.open .dropdown-toggle{outline:0}.btn-group>.btn+.dropdown-toggle{padding-left:8px;padding-right:8px}.btn-group>.btn-lg+.dropdown-toggle{padding-left:12px;padding-right:12px}.btn-group.open .dropdown-toggle{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn-group.open .dropdown-toggle.btn-link{-webkit-box-shadow:none;box-shadow:none}.btn .caret{margin-left:0}.btn-lg .caret{border-width:5px 5px 0;border-bottom-width:0}.dropup .btn-lg .caret{border-width:0 5px 5px}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group,.btn-group-vertical>.btn-group>.btn{display:block;float:none;width:100%;max-width:100%}.btn-group-vertical>.btn-group>.btn{float:none}.btn-group-vertical>.btn+.btn,.btn-group-vertical>.btn+.btn-group,.btn-group-vertical>.btn-group+.btn,.btn-group-vertical>.btn-group+.btn-group{margin-top:-1px;margin-left:0}.btn-group-vertical>.btn:not(:first-child):not(:last-child){border-radius:0}.btn-group-vertical>.btn:first-child:not(:last-child){border-top-right-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn:last-child:not(:first-child){border-bottom-left-radius:4px;border-top-right-radius:0;border-top-left-radius:0}.btn-group-vertical>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group-vertical>.btn-group:first-child:not(:last-child)>.btn:last-child,.btn-group-vertical>.btn-group:first-child:not(:last-child)>.dropdown-toggle{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn-group:last-child:not(:first-child)>.btn:first-child{border-top-right-radius:0;border-top-left-radius:0}.btn-group-justified{display:table;width:100%;table-layout:fixed;border-collapse:separate}.btn-group-justified>.btn,.btn-group-justified>.btn-group{float:none;display:table-cell;width:1%}.btn-group-justified>.btn-group .btn{width:100%}.btn-group-justified>.btn-group .dropdown-menu{left:auto}[data-toggle="buttons"]>.btn input[type="radio"],[data-toggle="buttons"]>.btn-group>.btn input[type="radio"],[data-toggle="buttons"]>.btn input[type="checkbox"],[data-toggle="buttons"]>.btn-group>.btn input[type="checkbox"]{position:absolute;clip:rect(0, 0, 0, 0);pointer-events:none}.input-group{position:relative;display:table;border-collapse:separate}.input-group[class*="col-"]{float:none;padding-left:0;padding-right:0}.input-group .form-control{position:relative;z-index:2;float:left;width:100%;margin-bottom:0}.input-group-lg>.form-control,.input-group-lg>.input-group-addon,.input-group-lg>.input-group-btn>.btn{height:57px;padding:14px 16px;font-size:20px;line-height:1.33;border-radius:6px}select.input-group-lg>.form-control,select.input-group-lg>.input-group-addon,select.input-group-lg>.input-group-btn>.btn{height:57px;line-height:57px}textarea.input-group-lg>.form-control,textarea.input-group-lg>.input-group-addon,textarea.input-group-lg>.input-group-btn>.btn,select[multiple].input-group-lg>.form-control,select[multiple].input-group-lg>.input-group-addon,select[multiple].input-group-lg>.input-group-btn>.btn{height:auto}.input-group-sm>.form-control,.input-group-sm>.input-group-addon,.input-group-sm>.input-group-btn>.btn{height:33px;padding:5px 10px;font-size:14px;line-height:1.5;border-radius:3px}select.input-group-sm>.form-control,select.input-group-sm>.input-group-addon,select.input-group-sm>.input-group-btn>.btn{height:33px;line-height:33px}textarea.input-group-sm>.form-control,textarea.input-group-sm>.input-group-addon,textarea.input-group-sm>.input-group-btn>.btn,select[multiple].input-group-sm>.form-control,select[multiple].input-group-sm>.input-group-addon,select[multiple].input-group-sm>.input-group-btn>.btn{height:auto}.input-group-addon,.input-group-btn,.input-group .form-control{display:table-cell}.input-group-addon:not(:first-child):not(:last-child),.input-group-btn:not(:first-child):not(:last-child),.input-group .form-control:not(:first-child):not(:last-child){border-radius:0}.input-group-addon,.input-group-btn{width:1%;white-space:nowrap;vertical-align:middle}.input-group-addon{padding:8px 12px;font-size:16px;font-weight:normal;line-height:1;color:#333333;text-align:center;background-color:#eeeeee;border:1px solid #dddddd;border-radius:4px}.input-group-addon.input-sm{padding:5px 10px;font-size:14px;border-radius:3px}.input-group-addon.input-lg{padding:14px 16px;font-size:20px;border-radius:6px}.input-group-addon input[type="radio"],.input-group-addon input[type="checkbox"]{margin-top:0}.input-group .form-control:first-child,.input-group-addon:first-child,.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group>.btn,.input-group-btn:first-child>.dropdown-toggle,.input-group-btn:last-child>.btn:not(:last-child):not(.dropdown-toggle),.input-group-btn:last-child>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-top-right-radius:0}.input-group-addon:first-child{border-right:0}.input-group .form-control:last-child,.input-group-addon:last-child,.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group>.btn,.input-group-btn:last-child>.dropdown-toggle,.input-group-btn:first-child>.btn:not(:first-child),.input-group-btn:first-child>.btn-group:not(:first-child)>.btn{border-bottom-left-radius:0;border-top-left-radius:0}.input-group-addon:last-child{border-left:0}.input-group-btn{position:relative;font-size:0;white-space:nowrap}.input-group-btn>.btn{position:relative}.input-group-btn>.btn+.btn{margin-left:-1px}.input-group-btn>.btn:hover,.input-group-btn>.btn:focus,.input-group-btn>.btn:active{z-index:2}.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group{margin-right:-1px}.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group{margin-left:-1px}.nav{margin-bottom:0;padding-left:0;list-style:none}.nav>li{position:relative;display:block}.nav>li>a{position:relative;display:block;padding:10px 15px}.nav>li>a:hover,.nav>li>a:focus{text-decoration:none;background-color:#eeeeee}.nav>li.disabled>a{color:#b3b3b3}.nav>li.disabled>a:hover,.nav>li.disabled>a:focus{color:#b3b3b3;text-decoration:none;background-color:transparent;cursor:not-allowed}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{background-color:#eeeeee;border-color:#4582ec}.nav .nav-divider{height:1px;margin:10px 0;overflow:hidden;background-color:#e5e5e5}.nav>li>a>img{max-width:none}.nav-tabs{border-bottom:1px solid #dddddd}.nav-tabs>li{float:left;margin-bottom:-1px}.nav-tabs>li>a{margin-right:2px;line-height:1.42857143;border:1px solid transparent;border-radius:4px 4px 0 0}.nav-tabs>li>a:hover{border-color:#eeeeee #eeeeee #dddddd}.nav-tabs>li.active>a,.nav-tabs>li.active>a:hover,.nav-tabs>li.active>a:focus{color:#555555;background-color:#ffffff;border:1px solid #dddddd;border-bottom-color:transparent;cursor:default}.nav-tabs.nav-justified{width:100%;border-bottom:0}.nav-tabs.nav-justified>li{float:none}.nav-tabs.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-tabs.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-tabs.nav-justified>li{display:table-cell;width:1%}.nav-tabs.nav-justified>li>a{margin-bottom:0}}.nav-tabs.nav-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs.nav-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border-bottom-color:#ffffff}}.nav-pills>li{float:left}.nav-pills>li>a{border-radius:4px}.nav-pills>li+li{margin-left:2px}.nav-pills>li.active>a,.nav-pills>li.active>a:hover,.nav-pills>li.active>a:focus{color:#ffffff;background-color:#4582ec}.nav-stacked>li{float:none}.nav-stacked>li+li{margin-top:2px;margin-left:0}.nav-justified{width:100%}.nav-justified>li{float:none}.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-justified>li{display:table-cell;width:1%}.nav-justified>li>a{margin-bottom:0}}.nav-tabs-justified{border-bottom:0}.nav-tabs-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border-bottom-color:#ffffff}}.tab-content>.tab-pane{display:none;visibility:hidden}.tab-content>.active{display:block;visibility:visible}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-right-radius:0;border-top-left-radius:0}.navbar{position:relative;min-height:65px;margin-bottom:22px;border:1px solid transparent}@media (min-width:768px){.navbar{border-radius:4px}}@media (min-width:768px){.navbar-header{float:left}}.navbar-collapse{overflow-x:visible;padding-right:15px;padding-left:15px;border-top:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);-webkit-overflow-scrolling:touch}.navbar-collapse.in{overflow-y:auto}@media (min-width:768px){.navbar-collapse{width:auto;border-top:0;-webkit-box-shadow:none;box-shadow:none}.navbar-collapse.collapse{display:block !important;visibility:visible !important;height:auto !important;padding-bottom:0;overflow:visible !important}.navbar-collapse.in{overflow-y:visible}.navbar-fixed-top .navbar-collapse,.navbar-static-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{padding-left:0;padding-right:0}}.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:340px}@media (max-device-width:480px) and (orientation:landscape){.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:200px}}.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:0;margin-left:0}}.navbar-static-top{z-index:1000;border-width:0 0 1px}@media (min-width:768px){.navbar-static-top{border-radius:0}}.navbar-fixed-top,.navbar-fixed-bottom{position:fixed;right:0;left:0;z-index:1030}@media (min-width:768px){.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}}.navbar-fixed-top{top:0;border-width:0 0 1px}.navbar-fixed-bottom{bottom:0;margin-bottom:0;border-width:1px 0 0}.navbar-brand{float:left;padding:21.5px 15px;font-size:20px;line-height:22px;height:65px}.navbar-brand:hover,.navbar-brand:focus{text-decoration:none}.navbar-brand>img{display:block}@media (min-width:768px){.navbar>.container .navbar-brand,.navbar>.container-fluid .navbar-brand{margin-left:-15px}}.navbar-toggle{position:relative;float:right;margin-right:15px;padding:9px 10px;margin-top:15.5px;margin-bottom:15.5px;background-color:transparent;background-image:none;border:1px solid transparent;border-radius:4px}.navbar-toggle:focus{outline:0}.navbar-toggle .icon-bar{display:block;width:22px;height:2px;border-radius:1px}.navbar-toggle .icon-bar+.icon-bar{margin-top:4px}@media (min-width:768px){.navbar-toggle{display:none}}.navbar-nav{margin:10.75px -15px}.navbar-nav>li>a{padding-top:10px;padding-bottom:10px;line-height:22px}@media (max-width:767px){.navbar-nav .open .dropdown-menu{position:static;float:none;width:auto;margin-top:0;background-color:transparent;border:0;-webkit-box-shadow:none;box-shadow:none}.navbar-nav .open .dropdown-menu>li>a,.navbar-nav .open .dropdown-menu .dropdown-header{padding:5px 15px 5px 25px}.navbar-nav .open .dropdown-menu>li>a{line-height:22px}.navbar-nav .open .dropdown-menu>li>a:hover,.navbar-nav .open .dropdown-menu>li>a:focus{background-image:none}}@media (min-width:768px){.navbar-nav{float:left;margin:0}.navbar-nav>li{float:left}.navbar-nav>li>a{padding-top:21.5px;padding-bottom:21.5px}}.navbar-form{margin-left:-15px;margin-right:-15px;padding:10px 15px;border-top:1px solid transparent;border-bottom:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);margin-top:12.5px;margin-bottom:12.5px}@media (min-width:768px){.navbar-form .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.navbar-form .form-control{display:inline-block;width:auto;vertical-align:middle}.navbar-form .form-control-static{display:inline-block}.navbar-form .input-group{display:inline-table;vertical-align:middle}.navbar-form .input-group .input-group-addon,.navbar-form .input-group .input-group-btn,.navbar-form .input-group .form-control{width:auto}.navbar-form .input-group>.form-control{width:100%}.navbar-form .control-label{margin-bottom:0;vertical-align:middle}.navbar-form .radio,.navbar-form .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.navbar-form .radio label,.navbar-form .checkbox label{padding-left:0}.navbar-form .radio input[type="radio"],.navbar-form .checkbox input[type="checkbox"]{position:relative;margin-left:0}.navbar-form .has-feedback .form-control-feedback{top:0}}@media (max-width:767px){.navbar-form .form-group{margin-bottom:5px}.navbar-form .form-group:last-child{margin-bottom:0}}@media (min-width:768px){.navbar-form{width:auto;border:0;margin-left:0;margin-right:0;padding-top:0;padding-bottom:0;-webkit-box-shadow:none;box-shadow:none}}.navbar-nav>li>.dropdown-menu{margin-top:0;border-top-right-radius:0;border-top-left-radius:0}.navbar-fixed-bottom .navbar-nav>li>.dropdown-menu{border-top-right-radius:4px;border-top-left-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.navbar-btn{margin-top:12.5px;margin-bottom:12.5px}.navbar-btn.btn-sm{margin-top:16px;margin-bottom:16px}.navbar-btn.btn-xs{margin-top:21.5px;margin-bottom:21.5px}.navbar-text{margin-top:21.5px;margin-bottom:21.5px}@media (min-width:768px){.navbar-text{float:left;margin-left:15px;margin-right:15px}}@media (min-width:768px){.navbar-left{float:left !important}.navbar-right{float:right !important;margin-right:-15px}.navbar-right~.navbar-right{margin-right:0}}.navbar-default{background-color:#ffffff;border-color:#dddddd}.navbar-default .navbar-brand{color:#4582ec}.navbar-default .navbar-brand:hover,.navbar-default .navbar-brand:focus{color:#4582ec;background-color:transparent}.navbar-default .navbar-text{color:#333333}.navbar-default .navbar-nav>li>a{color:#4582ec}.navbar-default .navbar-nav>li>a:hover,.navbar-default .navbar-nav>li>a:focus{color:#4582ec;background-color:transparent}.navbar-default .navbar-nav>.active>a,.navbar-default .navbar-nav>.active>a:hover,.navbar-default .navbar-nav>.active>a:focus{color:#4582ec;background-color:transparent}.navbar-default .navbar-nav>.disabled>a,.navbar-default .navbar-nav>.disabled>a:hover,.navbar-default .navbar-nav>.disabled>a:focus{color:#333333;background-color:transparent}.navbar-default .navbar-toggle{border-color:#dddddd}.navbar-default .navbar-toggle:hover,.navbar-default .navbar-toggle:focus{background-color:#dddddd}.navbar-default .navbar-toggle .icon-bar{background-color:#cccccc}.navbar-default .navbar-collapse,.navbar-default .navbar-form{border-color:#dddddd}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.open>a:hover,.navbar-default .navbar-nav>.open>a:focus{background-color:transparent;color:#4582ec}@media (max-width:767px){.navbar-default .navbar-nav .open .dropdown-menu>li>a{color:#4582ec}.navbar-default .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>li>a:focus{color:#4582ec;background-color:transparent}.navbar-default .navbar-nav .open .dropdown-menu>.active>a,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:focus{color:#4582ec;background-color:transparent}.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#333333;background-color:transparent}}.navbar-default .navbar-link{color:#4582ec}.navbar-default .navbar-link:hover{color:#4582ec}.navbar-default .btn-link{color:#4582ec}.navbar-default .btn-link:hover,.navbar-default .btn-link:focus{color:#4582ec}.navbar-default .btn-link[disabled]:hover,fieldset[disabled] .navbar-default .btn-link:hover,.navbar-default .btn-link[disabled]:focus,fieldset[disabled] .navbar-default .btn-link:focus{color:#333333}.navbar-inverse{background-color:#ffffff;border-color:#dddddd}.navbar-inverse .navbar-brand{color:#333333}.navbar-inverse .navbar-brand:hover,.navbar-inverse .navbar-brand:focus{color:#333333;background-color:transparent}.navbar-inverse .navbar-text{color:#333333}.navbar-inverse .navbar-nav>li>a{color:#333333}.navbar-inverse .navbar-nav>li>a:hover,.navbar-inverse .navbar-nav>li>a:focus{color:#333333;background-color:transparent}.navbar-inverse .navbar-nav>.active>a,.navbar-inverse .navbar-nav>.active>a:hover,.navbar-inverse .navbar-nav>.active>a:focus{color:#333333;background-color:transparent}.navbar-inverse .navbar-nav>.disabled>a,.navbar-inverse .navbar-nav>.disabled>a:hover,.navbar-inverse .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-inverse .navbar-toggle{border-color:#dddddd}.navbar-inverse .navbar-toggle:hover,.navbar-inverse .navbar-toggle:focus{background-color:#dddddd}.navbar-inverse .navbar-toggle .icon-bar{background-color:#cccccc}.navbar-inverse .navbar-collapse,.navbar-inverse .navbar-form{border-color:#ededed}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.open>a:hover,.navbar-inverse .navbar-nav>.open>a:focus{background-color:transparent;color:#333333}@media (max-width:767px){.navbar-inverse .navbar-nav .open .dropdown-menu>.dropdown-header{border-color:#dddddd}.navbar-inverse .navbar-nav .open .dropdown-menu .divider{background-color:#dddddd}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a{color:#333333}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:focus{color:#333333;background-color:transparent}.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:focus{color:#333333;background-color:transparent}.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-inverse .navbar-link{color:#333333}.navbar-inverse .navbar-link:hover{color:#333333}.navbar-inverse .btn-link{color:#333333}.navbar-inverse .btn-link:hover,.navbar-inverse .btn-link:focus{color:#333333}.navbar-inverse .btn-link[disabled]:hover,fieldset[disabled] .navbar-inverse .btn-link:hover,.navbar-inverse .btn-link[disabled]:focus,fieldset[disabled] .navbar-inverse .btn-link:focus{color:#cccccc}.breadcrumb{padding:8px 15px;margin-bottom:22px;list-style:none;background-color:#f5f5f5;border-radius:4px}.breadcrumb>li{display:inline-block}.breadcrumb>li+li:before{content:"/\00a0";padding:0 5px;color:#cccccc}.breadcrumb>.active{color:#b3b3b3}.pagination{display:inline-block;padding-left:0;margin:22px 0;border-radius:4px}.pagination>li{display:inline}.pagination>li>a,.pagination>li>span{position:relative;float:left;padding:8px 12px;line-height:1.42857143;text-decoration:none;color:#333333;background-color:#ffffff;border:1px solid #dddddd;margin-left:-1px}.pagination>li:first-child>a,.pagination>li:first-child>span{margin-left:0;border-bottom-left-radius:4px;border-top-left-radius:4px}.pagination>li:last-child>a,.pagination>li:last-child>span{border-bottom-right-radius:4px;border-top-right-radius:4px}.pagination>li>a:hover,.pagination>li>span:hover,.pagination>li>a:focus,.pagination>li>span:focus{color:#ffffff;background-color:#4582ec;border-color:#4582ec}.pagination>.active>a,.pagination>.active>span,.pagination>.active>a:hover,.pagination>.active>span:hover,.pagination>.active>a:focus,.pagination>.active>span:focus{z-index:2;color:#ffffff;background-color:#4582ec;border-color:#4582ec;cursor:default}.pagination>.disabled>span,.pagination>.disabled>span:hover,.pagination>.disabled>span:focus,.pagination>.disabled>a,.pagination>.disabled>a:hover,.pagination>.disabled>a:focus{color:#b3b3b3;background-color:#ffffff;border-color:#dddddd;cursor:not-allowed}.pagination-lg>li>a,.pagination-lg>li>span{padding:14px 16px;font-size:20px}.pagination-lg>li:first-child>a,.pagination-lg>li:first-child>span{border-bottom-left-radius:6px;border-top-left-radius:6px}.pagination-lg>li:last-child>a,.pagination-lg>li:last-child>span{border-bottom-right-radius:6px;border-top-right-radius:6px}.pagination-sm>li>a,.pagination-sm>li>span{padding:5px 10px;font-size:14px}.pagination-sm>li:first-child>a,.pagination-sm>li:first-child>span{border-bottom-left-radius:3px;border-top-left-radius:3px}.pagination-sm>li:last-child>a,.pagination-sm>li:last-child>span{border-bottom-right-radius:3px;border-top-right-radius:3px}.pager{padding-left:0;margin:22px 0;list-style:none;text-align:center}.pager li{display:inline}.pager li>a,.pager li>span{display:inline-block;padding:5px 14px;background-color:#ffffff;border:1px solid #dddddd;border-radius:15px}.pager li>a:hover,.pager li>a:focus{text-decoration:none;background-color:#4582ec}.pager .next>a,.pager .next>span{float:right}.pager .previous>a,.pager .previous>span{float:left}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{color:#b3b3b3;background-color:#ffffff;cursor:not-allowed}.label{display:inline;padding:.2em .6em .3em;font-size:75%;font-weight:bold;line-height:1;color:#ffffff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25em}a.label:hover,a.label:focus{color:#ffffff;text-decoration:none;cursor:pointer}.label:empty{display:none}.btn .label{position:relative;top:-1px}.label-default{background-color:#ffffff}.label-default[href]:hover,.label-default[href]:focus{background-color:#e6e6e6}.label-primary{background-color:#4582ec}.label-primary[href]:hover,.label-primary[href]:focus{background-color:#1863e6}.label-success{background-color:#3fad46}.label-success[href]:hover,.label-success[href]:focus{background-color:#318837}.label-info{background-color:#5bc0de}.label-info[href]:hover,.label-info[href]:focus{background-color:#31b0d5}.label-warning{background-color:#f0ad4e}.label-warning[href]:hover,.label-warning[href]:focus{background-color:#ec971f}.label-danger{background-color:#d9534f}.label-danger[href]:hover,.label-danger[href]:focus{background-color:#c9302c}.badge{display:inline-block;min-width:10px;padding:3px 7px;font-size:14px;font-weight:bold;color:#ffffff;line-height:1;vertical-align:baseline;white-space:nowrap;text-align:center;background-color:#4582ec;border-radius:10px}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.btn-xs .badge{top:0;padding:1px 5px}a.badge:hover,a.badge:focus{color:#ffffff;text-decoration:none;cursor:pointer}.list-group-item.active>.badge,.nav-pills>.active>a>.badge{color:#4582ec;background-color:#ffffff}.list-group-item>.badge{float:right}.list-group-item>.badge+.badge{margin-right:5px}.nav-pills>li>a>.badge{margin-left:3px}.jumbotron{padding:30px 15px;margin-bottom:30px;color:inherit;background-color:#f7f7f7}.jumbotron h1,.jumbotron .h1{color:inherit}.jumbotron p{margin-bottom:15px;font-size:24px;font-weight:200}.jumbotron>hr{border-top-color:#dedede}.container .jumbotron,.container-fluid .jumbotron{border-radius:6px}.jumbotron .container{max-width:100%}@media screen and (min-width:768px){.jumbotron{padding:48px 0}.container .jumbotron,.container-fluid .jumbotron{padding-left:60px;padding-right:60px}.jumbotron h1,.jumbotron .h1{font-size:72px}}.thumbnail{display:block;padding:4px;margin-bottom:22px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:border .2s ease-in-out;-o-transition:border .2s ease-in-out;transition:border .2s ease-in-out}.thumbnail>img,.thumbnail a>img{margin-left:auto;margin-right:auto}a.thumbnail:hover,a.thumbnail:focus,a.thumbnail.active{border-color:#4582ec}.thumbnail .caption{padding:9px;color:#333333}.alert{padding:15px;margin-bottom:22px;border:1px solid transparent;border-radius:4px}.alert h4{margin-top:0;color:inherit}.alert .alert-link{font-weight:bold}.alert>p,.alert>ul{margin-bottom:0}.alert>p+p{margin-top:5px}.alert-dismissable,.alert-dismissible{padding-right:35px}.alert-dismissable .close,.alert-dismissible .close{position:relative;top:-2px;right:-21px;color:inherit}.alert-success{background-color:#3fad46;border-color:#3fad46;color:#ffffff}.alert-success hr{border-top-color:#389a3e}.alert-success .alert-link{color:#e6e6e6}.alert-info{background-color:#5bc0de;border-color:#5bc0de;color:#ffffff}.alert-info hr{border-top-color:#46b8da}.alert-info .alert-link{color:#e6e6e6}.alert-warning{background-color:#f0ad4e;border-color:#f0ad4e;color:#ffffff}.alert-warning hr{border-top-color:#eea236}.alert-warning .alert-link{color:#e6e6e6}.alert-danger{background-color:#d9534f;border-color:#d9534f;color:#ffffff}.alert-danger hr{border-top-color:#d43f3a}.alert-danger .alert-link{color:#e6e6e6}@-webkit-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@-o-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}.progress{overflow:hidden;height:22px;margin-bottom:22px;background-color:#f5f5f5;border-radius:4px;-webkit-box-shadow:inset 0 1px 2px rgba(0,0,0,0.1);box-shadow:inset 0 1px 2px rgba(0,0,0,0.1)}.progress-bar{float:left;width:0%;height:100%;font-size:14px;line-height:22px;color:#ffffff;text-align:center;background-color:#4582ec;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);-webkit-transition:width 0.6s ease;-o-transition:width 0.6s ease;transition:width 0.6s ease}.progress-striped .progress-bar,.progress-bar-striped{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);-webkit-background-size:40px 40px;background-size:40px 40px}.progress.active .progress-bar,.progress-bar.active{-webkit-animation:progress-bar-stripes 2s linear infinite;-o-animation:progress-bar-stripes 2s linear infinite;animation:progress-bar-stripes 2s linear infinite}.progress-bar-success{background-color:#3fad46}.progress-striped .progress-bar-success{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-info{background-color:#5bc0de}.progress-striped .progress-bar-info{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-warning{background-color:#f0ad4e}.progress-striped .progress-bar-warning{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-danger{background-color:#d9534f}.progress-striped .progress-bar-danger{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.media{margin-top:15px}.media:first-child{margin-top:0}.media-right,.media>.pull-right{padding-left:10px}.media-left,.media>.pull-left{padding-right:10px}.media-left,.media-right,.media-body{display:table-cell;vertical-align:top}.media-middle{vertical-align:middle}.media-bottom{vertical-align:bottom}.media-heading{margin-top:0;margin-bottom:5px}.media-list{padding-left:0;list-style:none}.list-group{margin-bottom:20px;padding-left:0}.list-group-item{position:relative;display:block;padding:10px 15px;margin-bottom:-1px;background-color:#ffffff;border:1px solid #dddddd}.list-group-item:first-child{border-top-right-radius:4px;border-top-left-radius:4px}.list-group-item:last-child{margin-bottom:0;border-bottom-right-radius:4px;border-bottom-left-radius:4px}a.list-group-item{color:#555555}a.list-group-item .list-group-item-heading{color:#333333}a.list-group-item:hover,a.list-group-item:focus{text-decoration:none;color:#555555;background-color:#f5f5f5}.list-group-item.disabled,.list-group-item.disabled:hover,.list-group-item.disabled:focus{background-color:#eeeeee;color:#b3b3b3;cursor:not-allowed}.list-group-item.disabled .list-group-item-heading,.list-group-item.disabled:hover .list-group-item-heading,.list-group-item.disabled:focus .list-group-item-heading{color:inherit}.list-group-item.disabled .list-group-item-text,.list-group-item.disabled:hover .list-group-item-text,.list-group-item.disabled:focus .list-group-item-text{color:#b3b3b3}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{z-index:2;color:#ffffff;background-color:#4582ec;border-color:#4582ec}.list-group-item.active .list-group-item-heading,.list-group-item.active:hover .list-group-item-heading,.list-group-item.active:focus .list-group-item-heading,.list-group-item.active .list-group-item-heading>small,.list-group-item.active:hover .list-group-item-heading>small,.list-group-item.active:focus .list-group-item-heading>small,.list-group-item.active .list-group-item-heading>.small,.list-group-item.active:hover .list-group-item-heading>.small,.list-group-item.active:focus .list-group-item-heading>.small{color:inherit}.list-group-item.active .list-group-item-text,.list-group-item.active:hover .list-group-item-text,.list-group-item.active:focus .list-group-item-text{color:#fefeff}.list-group-item-success{color:#3fad46;background-color:#dff0d8}a.list-group-item-success{color:#3fad46}a.list-group-item-success .list-group-item-heading{color:inherit}a.list-group-item-success:hover,a.list-group-item-success:focus{color:#3fad46;background-color:#d0e9c6}a.list-group-item-success.active,a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{color:#fff;background-color:#3fad46;border-color:#3fad46}.list-group-item-info{color:#5bc0de;background-color:#d9edf7}a.list-group-item-info{color:#5bc0de}a.list-group-item-info .list-group-item-heading{color:inherit}a.list-group-item-info:hover,a.list-group-item-info:focus{color:#5bc0de;background-color:#c4e3f3}a.list-group-item-info.active,a.list-group-item-info.active:hover,a.list-group-item-info.active:focus{color:#fff;background-color:#5bc0de;border-color:#5bc0de}.list-group-item-warning{color:#f0ad4e;background-color:#fcf8e3}a.list-group-item-warning{color:#f0ad4e}a.list-group-item-warning .list-group-item-heading{color:inherit}a.list-group-item-warning:hover,a.list-group-item-warning:focus{color:#f0ad4e;background-color:#faf2cc}a.list-group-item-warning.active,a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{color:#fff;background-color:#f0ad4e;border-color:#f0ad4e}.list-group-item-danger{color:#d9534f;background-color:#f2dede}a.list-group-item-danger{color:#d9534f}a.list-group-item-danger .list-group-item-heading{color:inherit}a.list-group-item-danger:hover,a.list-group-item-danger:focus{color:#d9534f;background-color:#ebcccc}a.list-group-item-danger.active,a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{color:#fff;background-color:#d9534f;border-color:#d9534f}.list-group-item-heading{margin-top:0;margin-bottom:5px}.list-group-item-text{margin-bottom:0;line-height:1.3}.panel{margin-bottom:22px;background-color:#ffffff;border:1px solid transparent;border-radius:4px;-webkit-box-shadow:0 1px 1px rgba(0,0,0,0.05);box-shadow:0 1px 1px rgba(0,0,0,0.05)}.panel-body{padding:15px}.panel-heading{padding:10px 15px;border-bottom:1px solid transparent;border-top-right-radius:3px;border-top-left-radius:3px}.panel-heading>.dropdown .dropdown-toggle{color:inherit}.panel-title{margin-top:0;margin-bottom:0;font-size:18px;color:inherit}.panel-title>a{color:inherit}.panel-footer{padding:10px 15px;background-color:#ffffff;border-top:1px solid #dddddd;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.list-group,.panel>.panel-collapse>.list-group{margin-bottom:0}.panel>.list-group .list-group-item,.panel>.panel-collapse>.list-group .list-group-item{border-width:1px 0;border-radius:0}.panel>.list-group:first-child .list-group-item:first-child,.panel>.panel-collapse>.list-group:first-child .list-group-item:first-child{border-top:0;border-top-right-radius:3px;border-top-left-radius:3px}.panel>.list-group:last-child .list-group-item:last-child,.panel>.panel-collapse>.list-group:last-child .list-group-item:last-child{border-bottom:0;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel-heading+.list-group .list-group-item:first-child{border-top-width:0}.list-group+.panel-footer{border-top-width:0}.panel>.table,.panel>.table-responsive>.table,.panel>.panel-collapse>.table{margin-bottom:0}.panel>.table caption,.panel>.table-responsive>.table caption,.panel>.panel-collapse>.table caption{padding-left:15px;padding-right:15px}.panel>.table:first-child,.panel>.table-responsive:first-child>.table:first-child{border-top-right-radius:3px;border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child{border-top-left-radius:3px;border-top-right-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:first-child{border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:last-child{border-top-right-radius:3px}.panel>.table:last-child,.panel>.table-responsive:last-child>.table:last-child{border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child{border-bottom-left-radius:3px;border-bottom-right-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:first-child{border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:last-child{border-bottom-right-radius:3px}.panel>.panel-body+.table,.panel>.panel-body+.table-responsive,.panel>.table+.panel-body,.panel>.table-responsive+.panel-body{border-top:1px solid #dddddd}.panel>.table>tbody:first-child>tr:first-child th,.panel>.table>tbody:first-child>tr:first-child td{border-top:0}.panel>.table-bordered,.panel>.table-responsive>.table-bordered{border:0}.panel>.table-bordered>thead>tr>th:first-child,.panel>.table-responsive>.table-bordered>thead>tr>th:first-child,.panel>.table-bordered>tbody>tr>th:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:first-child,.panel>.table-bordered>tfoot>tr>th:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:first-child,.panel>.table-bordered>thead>tr>td:first-child,.panel>.table-responsive>.table-bordered>thead>tr>td:first-child,.panel>.table-bordered>tbody>tr>td:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:first-child,.panel>.table-bordered>tfoot>tr>td:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.panel>.table-bordered>thead>tr>th:last-child,.panel>.table-responsive>.table-bordered>thead>tr>th:last-child,.panel>.table-bordered>tbody>tr>th:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:last-child,.panel>.table-bordered>tfoot>tr>th:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:last-child,.panel>.table-bordered>thead>tr>td:last-child,.panel>.table-responsive>.table-bordered>thead>tr>td:last-child,.panel>.table-bordered>tbody>tr>td:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:last-child,.panel>.table-bordered>tfoot>tr>td:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.panel>.table-bordered>thead>tr:first-child>td,.panel>.table-responsive>.table-bordered>thead>tr:first-child>td,.panel>.table-bordered>tbody>tr:first-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>td,.panel>.table-bordered>thead>tr:first-child>th,.panel>.table-responsive>.table-bordered>thead>tr:first-child>th,.panel>.table-bordered>tbody>tr:first-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>th{border-bottom:0}.panel>.table-bordered>tbody>tr:last-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>td,.panel>.table-bordered>tfoot>tr:last-child>td,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>td,.panel>.table-bordered>tbody>tr:last-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>th,.panel>.table-bordered>tfoot>tr:last-child>th,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>th{border-bottom:0}.panel>.table-responsive{border:0;margin-bottom:0}.panel-group{margin-bottom:22px}.panel-group .panel{margin-bottom:0;border-radius:4px}.panel-group .panel+.panel{margin-top:5px}.panel-group .panel-heading{border-bottom:0}.panel-group .panel-heading+.panel-collapse>.panel-body,.panel-group .panel-heading+.panel-collapse>.list-group{border-top:1px solid #dddddd}.panel-group .panel-footer{border-top:0}.panel-group .panel-footer+.panel-collapse .panel-body{border-bottom:1px solid #dddddd}.panel-default{border-color:#dddddd}.panel-default>.panel-heading{color:#333333;background-color:#f5f5f5;border-color:#dddddd}.panel-default>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-default>.panel-heading .badge{color:#f5f5f5;background-color:#333333}.panel-default>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-primary{border-color:transparent}.panel-primary>.panel-heading{color:#ffffff;background-color:#4582ec;border-color:transparent}.panel-primary>.panel-heading+.panel-collapse>.panel-body{border-top-color:transparent}.panel-primary>.panel-heading .badge{color:#4582ec;background-color:#ffffff}.panel-primary>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:transparent}.panel-success{border-color:transparent}.panel-success>.panel-heading{color:#3fad46;background-color:#3fad46;border-color:transparent}.panel-success>.panel-heading+.panel-collapse>.panel-body{border-top-color:transparent}.panel-success>.panel-heading .badge{color:#3fad46;background-color:#3fad46}.panel-success>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:transparent}.panel-info{border-color:transparent}.panel-info>.panel-heading{color:#5bc0de;background-color:#5bc0de;border-color:transparent}.panel-info>.panel-heading+.panel-collapse>.panel-body{border-top-color:transparent}.panel-info>.panel-heading .badge{color:#5bc0de;background-color:#5bc0de}.panel-info>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:transparent}.panel-warning{border-color:transparent}.panel-warning>.panel-heading{color:#f0ad4e;background-color:#f0ad4e;border-color:transparent}.panel-warning>.panel-heading+.panel-collapse>.panel-body{border-top-color:transparent}.panel-warning>.panel-heading .badge{color:#f0ad4e;background-color:#f0ad4e}.panel-warning>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:transparent}.panel-danger{border-color:transparent}.panel-danger>.panel-heading{color:#d9534f;background-color:#d9534f;border-color:transparent}.panel-danger>.panel-heading+.panel-collapse>.panel-body{border-top-color:transparent}.panel-danger>.panel-heading .badge{color:#d9534f;background-color:#d9534f}.panel-danger>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:transparent}.embed-responsive{position:relative;display:block;height:0;padding:0;overflow:hidden}.embed-responsive .embed-responsive-item,.embed-responsive iframe,.embed-responsive embed,.embed-responsive object,.embed-responsive video{position:absolute;top:0;left:0;bottom:0;height:100%;width:100%;border:0}.embed-responsive.embed-responsive-16by9{padding-bottom:56.25%}.embed-responsive.embed-responsive-4by3{padding-bottom:75%}.well{min-height:20px;padding:19px;margin-bottom:20px;background-color:#f7f7f7;border:1px solid #e5e5e5;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.05);box-shadow:inset 0 1px 1px rgba(0,0,0,0.05)}.well blockquote{border-color:#ddd;border-color:rgba(0,0,0,0.15)}.well-lg{padding:24px;border-radius:6px}.well-sm{padding:9px;border-radius:3px}.close{float:right;font-size:24px;font-weight:bold;line-height:1;color:#ffffff;text-shadow:0 1px 0 #ffffff;opacity:0.2;filter:alpha(opacity=20)}.close:hover,.close:focus{color:#ffffff;text-decoration:none;cursor:pointer;opacity:0.5;filter:alpha(opacity=50)}button.close{padding:0;cursor:pointer;background:transparent;border:0;-webkit-appearance:none}.modal-open{overflow:hidden}.modal{display:none;overflow:hidden;position:fixed;top:0;right:0;bottom:0;left:0;z-index:1040;-webkit-overflow-scrolling:touch;outline:0}.modal.fade .modal-dialog{-webkit-transform:translate(0, -25%);-ms-transform:translate(0, -25%);-o-transform:translate(0, -25%);transform:translate(0, -25%);-webkit-transition:-webkit-transform .3s ease-out;-o-transition:-o-transform .3s ease-out;transition:transform .3s ease-out}.modal.in .modal-dialog{-webkit-transform:translate(0, 0);-ms-transform:translate(0, 0);-o-transform:translate(0, 0);transform:translate(0, 0)}.modal-open .modal{overflow-x:hidden;overflow-y:auto}.modal-dialog{position:relative;width:auto;margin:10px}.modal-content{position:relative;background-color:#ffffff;border:1px solid #999999;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 3px 9px rgba(0,0,0,0.5);box-shadow:0 3px 9px rgba(0,0,0,0.5);-webkit-background-clip:padding-box;background-clip:padding-box;outline:0}.modal-backdrop{position:absolute;top:0;right:0;left:0;background-color:#000000}.modal-backdrop.fade{opacity:0;filter:alpha(opacity=0)}.modal-backdrop.in{opacity:0.5;filter:alpha(opacity=50)}.modal-header{padding:15px;border-bottom:1px solid #e5e5e5;min-height:16.42857143px}.modal-header .close{margin-top:-2px}.modal-title{margin:0;line-height:1.42857143}.modal-body{position:relative;padding:20px}.modal-footer{padding:20px;text-align:right;border-top:1px solid #e5e5e5}.modal-footer .btn+.btn{margin-left:5px;margin-bottom:0}.modal-footer .btn-group .btn+.btn{margin-left:-1px}.modal-footer .btn-block+.btn-block{margin-left:0}.modal-scrollbar-measure{position:absolute;top:-9999px;width:50px;height:50px;overflow:scroll}@media (min-width:768px){.modal-dialog{width:600px;margin:30px auto}.modal-content{-webkit-box-shadow:0 5px 15px rgba(0,0,0,0.5);box-shadow:0 5px 15px rgba(0,0,0,0.5)}.modal-sm{width:300px}}@media (min-width:992px){.modal-lg{width:900px}}.tooltip{position:absolute;z-index:1070;display:block;visibility:visible;font-family:Georgia,"Times New Roman",Times,serif;font-size:14px;font-weight:normal;line-height:1.4;opacity:0;filter:alpha(opacity=0)}.tooltip.in{opacity:0.9;filter:alpha(opacity=90)}.tooltip.top{margin-top:-3px;padding:5px 0}.tooltip.right{margin-left:3px;padding:0 5px}.tooltip.bottom{margin-top:3px;padding:5px 0}.tooltip.left{margin-left:-3px;padding:0 5px}.tooltip-inner{max-width:200px;padding:3px 8px;color:#ffffff;text-align:center;text-decoration:none;background-color:rgba(0,0,0,0.9);border-radius:4px}.tooltip-arrow{position:absolute;width:0;height:0;border-color:transparent;border-style:solid}.tooltip.top .tooltip-arrow{bottom:0;left:50%;margin-left:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-left .tooltip-arrow{bottom:0;right:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-right .tooltip-arrow{bottom:0;left:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.right .tooltip-arrow{top:50%;left:0;margin-top:-5px;border-width:5px 5px 5px 0;border-right-color:rgba(0,0,0,0.9)}.tooltip.left .tooltip-arrow{top:50%;right:0;margin-top:-5px;border-width:5px 0 5px 5px;border-left-color:rgba(0,0,0,0.9)}.tooltip.bottom .tooltip-arrow{top:0;left:50%;margin-left:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-left .tooltip-arrow{top:0;right:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-right .tooltip-arrow{top:0;left:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.popover{position:absolute;top:0;left:0;z-index:1060;display:none;max-width:276px;padding:1px;font-family:Georgia,"Times New Roman",Times,serif;font-size:16px;font-weight:normal;line-height:1.42857143;text-align:left;background-color:#ffffff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 5px 10px rgba(0,0,0,0.2);box-shadow:0 5px 10px rgba(0,0,0,0.2);white-space:normal}.popover.top{margin-top:-10px}.popover.right{margin-left:10px}.popover.bottom{margin-top:10px}.popover.left{margin-left:-10px}.popover-title{margin:0;padding:8px 14px;font-size:16px;background-color:#f7f7f7;border-bottom:1px solid #ebebeb;border-radius:5px 5px 0 0}.popover-content{padding:9px 14px}.popover>.arrow,.popover>.arrow:after{position:absolute;display:block;width:0;height:0;border-color:transparent;border-style:solid}.popover>.arrow{border-width:11px}.popover>.arrow:after{border-width:10px;content:""}.popover.top>.arrow{left:50%;margin-left:-11px;border-bottom-width:0;border-top-color:#999999;border-top-color:rgba(0,0,0,0.25);bottom:-11px}.popover.top>.arrow:after{content:" ";bottom:1px;margin-left:-10px;border-bottom-width:0;border-top-color:#ffffff}.popover.right>.arrow{top:50%;left:-11px;margin-top:-11px;border-left-width:0;border-right-color:#999999;border-right-color:rgba(0,0,0,0.25)}.popover.right>.arrow:after{content:" ";left:1px;bottom:-10px;border-left-width:0;border-right-color:#ffffff}.popover.bottom>.arrow{left:50%;margin-left:-11px;border-top-width:0;border-bottom-color:#999999;border-bottom-color:rgba(0,0,0,0.25);top:-11px}.popover.bottom>.arrow:after{content:" ";top:1px;margin-left:-10px;border-top-width:0;border-bottom-color:#ffffff}.popover.left>.arrow{top:50%;right:-11px;margin-top:-11px;border-right-width:0;border-left-color:#999999;border-left-color:rgba(0,0,0,0.25)}.popover.left>.arrow:after{content:" ";right:1px;border-right-width:0;border-left-color:#ffffff;bottom:-10px}.carousel{position:relative}.carousel-inner{position:relative;overflow:hidden;width:100%}.carousel-inner>.item{display:none;position:relative;-webkit-transition:.6s ease-in-out left;-o-transition:.6s ease-in-out left;transition:.6s ease-in-out left}.carousel-inner>.item>img,.carousel-inner>.item>a>img{line-height:1}@media all and (transform-3d),(-webkit-transform-3d){.carousel-inner>.item{-webkit-transition:-webkit-transform .6s ease-in-out;-o-transition:-o-transform .6s ease-in-out;transition:transform .6s ease-in-out;-webkit-backface-visibility:hidden;backface-visibility:hidden;-webkit-perspective:1000;perspective:1000}.carousel-inner>.item.next,.carousel-inner>.item.active.right{-webkit-transform:translate3d(100%, 0, 0);transform:translate3d(100%, 0, 0);left:0}.carousel-inner>.item.prev,.carousel-inner>.item.active.left{-webkit-transform:translate3d(-100%, 0, 0);transform:translate3d(-100%, 0, 0);left:0}.carousel-inner>.item.next.left,.carousel-inner>.item.prev.right,.carousel-inner>.item.active{-webkit-transform:translate3d(0, 0, 0);transform:translate3d(0, 0, 0);left:0}}.carousel-inner>.active,.carousel-inner>.next,.carousel-inner>.prev{display:block}.carousel-inner>.active{left:0}.carousel-inner>.next,.carousel-inner>.prev{position:absolute;top:0;width:100%}.carousel-inner>.next{left:100%}.carousel-inner>.prev{left:-100%}.carousel-inner>.next.left,.carousel-inner>.prev.right{left:0}.carousel-inner>.active.left{left:-100%}.carousel-inner>.active.right{left:100%}.carousel-control{position:absolute;top:0;left:0;bottom:0;width:15%;opacity:0.5;filter:alpha(opacity=50);font-size:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-control.left{background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.5)), to(rgba(0,0,0,0.0001)));background-image:linear-gradient(to right, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1)}.carousel-control.right{left:auto;right:0;background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.0001)), to(rgba(0,0,0,0.5)));background-image:linear-gradient(to right, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1)}.carousel-control:hover,.carousel-control:focus{outline:0;color:#ffffff;text-decoration:none;opacity:0.9;filter:alpha(opacity=90)}.carousel-control .icon-prev,.carousel-control .icon-next,.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right{position:absolute;top:50%;z-index:5;display:inline-block}.carousel-control .icon-prev,.carousel-control .glyphicon-chevron-left{left:50%;margin-left:-10px}.carousel-control .icon-next,.carousel-control .glyphicon-chevron-right{right:50%;margin-right:-10px}.carousel-control .icon-prev,.carousel-control .icon-next{width:20px;height:20px;margin-top:-10px;font-family:serif}.carousel-control .icon-prev:before{content:'\2039'}.carousel-control .icon-next:before{content:'\203a'}.carousel-indicators{position:absolute;bottom:10px;left:50%;z-index:15;width:60%;margin-left:-30%;padding-left:0;list-style:none;text-align:center}.carousel-indicators li{display:inline-block;width:10px;height:10px;margin:1px;text-indent:-999px;border:1px solid #ffffff;border-radius:10px;cursor:pointer;background-color:#000 \9;background-color:rgba(0,0,0,0)}.carousel-indicators .active{margin:0;width:12px;height:12px;background-color:#ffffff}.carousel-caption{position:absolute;left:15%;right:15%;bottom:20px;z-index:10;padding-top:20px;padding-bottom:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-caption .btn{text-shadow:none}@media screen and (min-width:768px){.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right,.carousel-control .icon-prev,.carousel-control .icon-next{width:30px;height:30px;margin-top:-15px;font-size:30px}.carousel-control .glyphicon-chevron-left,.carousel-control .icon-prev{margin-left:-15px}.carousel-control .glyphicon-chevron-right,.carousel-control .icon-next{margin-right:-15px}.carousel-caption{left:20%;right:20%;padding-bottom:30px}.carousel-indicators{bottom:20px}}.clearfix:before,.clearfix:after,.dl-horizontal dd:before,.dl-horizontal dd:after,.container:before,.container:after,.container-fluid:before,.container-fluid:after,.row:before,.row:after,.form-horizontal .form-group:before,.form-horizontal .form-group:after,.btn-toolbar:before,.btn-toolbar:after,.btn-group-vertical>.btn-group:before,.btn-group-vertical>.btn-group:after,.nav:before,.nav:after,.navbar:before,.navbar:after,.navbar-header:before,.navbar-header:after,.navbar-collapse:before,.navbar-collapse:after,.pager:before,.pager:after,.panel-body:before,.panel-body:after,.modal-footer:before,.modal-footer:after{content:" ";display:table}.clearfix:after,.dl-horizontal dd:after,.container:after,.container-fluid:after,.row:after,.form-horizontal .form-group:after,.btn-toolbar:after,.btn-group-vertical>.btn-group:after,.nav:after,.navbar:after,.navbar-header:after,.navbar-collapse:after,.pager:after,.panel-body:after,.modal-footer:after{clear:both}.center-block{display:block;margin-left:auto;margin-right:auto}.pull-right{float:right !important}.pull-left{float:left !important}.hide{display:none !important}.show{display:block !important}.invisible{visibility:hidden}.text-hide{font:0/0 a;color:transparent;text-shadow:none;background-color:transparent;border:0}.hidden{display:none !important;visibility:hidden !important}.affix{position:fixed}@-ms-viewport{width:device-width}.visible-xs,.visible-sm,.visible-md,.visible-lg{display:none !important}.visible-xs-block,.visible-xs-inline,.visible-xs-inline-block,.visible-sm-block,.visible-sm-inline,.visible-sm-inline-block,.visible-md-block,.visible-md-inline,.visible-md-inline-block,.visible-lg-block,.visible-lg-inline,.visible-lg-inline-block{display:none !important}@media (max-width:767px){.visible-xs{display:block !important}table.visible-xs{display:table}tr.visible-xs{display:table-row !important}th.visible-xs,td.visible-xs{display:table-cell !important}}@media (max-width:767px){.visible-xs-block{display:block !important}}@media (max-width:767px){.visible-xs-inline{display:inline !important}}@media (max-width:767px){.visible-xs-inline-block{display:inline-block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm{display:block !important}table.visible-sm{display:table}tr.visible-sm{display:table-row !important}th.visible-sm,td.visible-sm{display:table-cell !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-block{display:block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline{display:inline !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline-block{display:inline-block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md{display:block !important}table.visible-md{display:table}tr.visible-md{display:table-row !important}th.visible-md,td.visible-md{display:table-cell !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-block{display:block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline{display:inline !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline-block{display:inline-block !important}}@media (min-width:1200px){.visible-lg{display:block !important}table.visible-lg{display:table}tr.visible-lg{display:table-row !important}th.visible-lg,td.visible-lg{display:table-cell !important}}@media (min-width:1200px){.visible-lg-block{display:block !important}}@media (min-width:1200px){.visible-lg-inline{display:inline !important}}@media (min-width:1200px){.visible-lg-inline-block{display:inline-block !important}}@media (max-width:767px){.hidden-xs{display:none !important}}@media (min-width:768px) and (max-width:991px){.hidden-sm{display:none !important}}@media (min-width:992px) and (max-width:1199px){.hidden-md{display:none !important}}@media (min-width:1200px){.hidden-lg{display:none !important}}.visible-print{display:none !important}@media print{.visible-print{display:block !important}table.visible-print{display:table}tr.visible-print{display:table-row !important}th.visible-print,td.visible-print{display:table-cell !important}}.visible-print-block{display:none !important}@media print{.visible-print-block{display:block !important}}.visible-print-inline{display:none !important}@media print{.visible-print-inline{display:inline !important}}.visible-print-inline-block{display:none !important}@media print{.visible-print-inline-block{display:inline-block !important}}@media print{.hidden-print{display:none !important}}.navbar{font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif}.navbar-nav,.navbar-form{margin-left:0;margin-right:0}.navbar-nav>li>a{padding:8px 12px;margin:12px 6px;border:1px solid transparent;border-radius:4px}.navbar-nav>li>a:hover{border:1px solid #ddd}.navbar-nav>.active>a,.navbar-nav>.active>a:hover{border:1px solid #ddd}.navbar-default .navbar-nav>.active>a:hover{color:#4582ec}.navbar-inverse .navbar-nav>.active>a:hover{color:#333333}.navbar-brand{padding-top:20px}@media (max-width:768px){.navbar .navbar-nav>li>a{margin:0}}.btn{font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif}legend{font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif}.input-group-addon{font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{border:1px solid #ddd}.pagination{font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif}.pagination-lg>li>a,.pagination-lg>li>span{padding:14px 24px}.pager{font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif}.pager a{color:#333333}.pager a:hover{border-color:transparent;color:#fff}.pager .disabled a{border-color:#dddddd}.close{color:#fff;text-decoration:none;text-shadow:none;opacity:0.4}.close:hover,.close:focus{color:#fff;opacity:1}.alert .alert-link{color:#ffffff;text-decoration:underline}.label{font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif;font-weight:normal}.label-default{border:1px solid #ddd;color:#333333}.badge{padding:1px 7px 5px;vertical-align:2px;font-family:"Raleway","Helvetica Neue",Helvetica,Arial,sans-serif;font-weight:normal}.panel{-webkit-box-shadow:none;box-shadow:none}.panel-default .close{color:#333333}.panel-primary .panel-heading,.panel-success .panel-heading,.panel-warning .panel-heading,.panel-danger .panel-heading,.panel-info .panel-heading{color:#fff}.panel-primary .panel-body,.panel-success .panel-body,.panel-warning .panel-body,.panel-danger .panel-body,.panel-info .panel-body{border:1px solid #ddd;border-top-width:0;border-radius:0 0 4px 4px}.modal .close{color:#333333} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/css/spacelab.min.css b/www/bootstrap-3.3.1/css/spacelab.min.css deleted file mode 100644 index ee6ffd8..0000000 --- a/www/bootstrap-3.3.1/css/spacelab.min.css +++ /dev/null @@ -1,32 +0,0 @@ -@font-face { - font-family: 'Open Sans'; - font-style: normal; - font-weight: 400; - src: url(fonts/OpenSans.ttf) format('truetype'); -} -@font-face { - font-family: 'Open Sans'; - font-style: normal; - font-weight: 700; - src: url(fonts/OpenSansBold.ttf) format('truetype'); -} -@font-face { - font-family: 'Open Sans'; - font-style: italic; - font-weight: 400; - src: url(fonts/OpenSansItalic.ttf) format('truetype'); -} -@font-face { - font-family: 'Open Sans'; - font-style: italic; - font-weight: 700; - src: url(fonts/OpenSansBoldItalic.ttf) format('truetype'); -} - -/*! - * bootswatch v3.3.1+1 - * Homepage: http://bootswatch.com - * Copyright 2012-2014 Thomas Park - * Licensed under MIT - * Based on Bootstrap -*//*! normalize.css v3.0.2 | MIT License | git.io/normalize */html{font-family:sans-serif;-ms-text-size-adjust:100%;-webkit-text-size-adjust:100%}body{margin:0}article,aside,details,figcaption,figure,footer,header,hgroup,main,menu,nav,section,summary{display:block}audio,canvas,progress,video{display:inline-block;vertical-align:baseline}audio:not([controls]){display:none;height:0}[hidden],template{display:none}a{background-color:transparent}a:active,a:hover{outline:0}abbr[title]{border-bottom:1px dotted}b,strong{font-weight:bold}dfn{font-style:italic}h1{font-size:2em;margin:0.67em 0}mark{background:#ff0;color:#000}small{font-size:80%}sub,sup{font-size:75%;line-height:0;position:relative;vertical-align:baseline}sup{top:-0.5em}sub{bottom:-0.25em}img{border:0}svg:not(:root){overflow:hidden}figure{margin:1em 40px}hr{-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box;height:0}pre{overflow:auto}code,kbd,pre,samp{font-family:monospace, monospace;font-size:1em}button,input,optgroup,select,textarea{color:inherit;font:inherit;margin:0}button{overflow:visible}button,select{text-transform:none}button,html input[type="button"],input[type="reset"],input[type="submit"]{-webkit-appearance:button;cursor:pointer}button[disabled],html input[disabled]{cursor:default}button::-moz-focus-inner,input::-moz-focus-inner{border:0;padding:0}input{line-height:normal}input[type="checkbox"],input[type="radio"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box;padding:0}input[type="number"]::-webkit-inner-spin-button,input[type="number"]::-webkit-outer-spin-button{height:auto}input[type="search"]{-webkit-appearance:textfield;-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box}input[type="search"]::-webkit-search-cancel-button,input[type="search"]::-webkit-search-decoration{-webkit-appearance:none}fieldset{border:1px solid #c0c0c0;margin:0 2px;padding:0.35em 0.625em 0.75em}legend{border:0;padding:0}textarea{overflow:auto}optgroup{font-weight:bold}table{border-collapse:collapse;border-spacing:0}td,th{padding:0}/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */@media print{*,*:before,*:after{background:transparent !important;color:#000 !important;-webkit-box-shadow:none !important;box-shadow:none !important;text-shadow:none !important}a,a:visited{text-decoration:underline}a[href]:after{content:" (" attr(href) ")"}abbr[title]:after{content:" (" attr(title) ")"}a[href^="#"]:after,a[href^="javascript:"]:after{content:""}pre,blockquote{border:1px solid #999;page-break-inside:avoid}thead{display:table-header-group}tr,img{page-break-inside:avoid}img{max-width:100% !important}p,h2,h3{orphans:3;widows:3}h2,h3{page-break-after:avoid}select{background:#fff !important}.navbar{display:none}.btn>.caret,.dropup>.btn>.caret{border-top-color:#000 !important}.label{border:1px solid #000}.table{border-collapse:collapse !important}.table td,.table th{background-color:#fff !important}.table-bordered th,.table-bordered td{border:1px solid #ddd !important}}@font-face{font-family:'Glyphicons Halflings';src:url('../fonts/glyphicons-halflings-regular.eot');src:url('../fonts/glyphicons-halflings-regular.eot?#iefix') format('embedded-opentype'),url('../fonts/glyphicons-halflings-regular.woff') format('woff'),url('../fonts/glyphicons-halflings-regular.ttf') format('truetype'),url('../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular') format('svg')}.glyphicon{position:relative;top:1px;display:inline-block;font-family:'Glyphicons Halflings';font-style:normal;font-weight:normal;line-height:1;-webkit-font-smoothing:antialiased;-moz-osx-font-smoothing:grayscale}.glyphicon-asterisk:before{content:"\2a"}.glyphicon-plus:before{content:"\2b"}.glyphicon-euro:before,.glyphicon-eur:before{content:"\20ac"}.glyphicon-minus:before{content:"\2212"}.glyphicon-cloud:before{content:"\2601"}.glyphicon-envelope:before{content:"\2709"}.glyphicon-pencil:before{content:"\270f"}.glyphicon-glass:before{content:"\e001"}.glyphicon-music:before{content:"\e002"}.glyphicon-search:before{content:"\e003"}.glyphicon-heart:before{content:"\e005"}.glyphicon-star:before{content:"\e006"}.glyphicon-star-empty:before{content:"\e007"}.glyphicon-user:before{content:"\e008"}.glyphicon-film:before{content:"\e009"}.glyphicon-th-large:before{content:"\e010"}.glyphicon-th:before{content:"\e011"}.glyphicon-th-list:before{content:"\e012"}.glyphicon-ok:before{content:"\e013"}.glyphicon-remove:before{content:"\e014"}.glyphicon-zoom-in:before{content:"\e015"}.glyphicon-zoom-out:before{content:"\e016"}.glyphicon-off:before{content:"\e017"}.glyphicon-signal:before{content:"\e018"}.glyphicon-cog:before{content:"\e019"}.glyphicon-trash:before{content:"\e020"}.glyphicon-home:before{content:"\e021"}.glyphicon-file:before{content:"\e022"}.glyphicon-time:before{content:"\e023"}.glyphicon-road:before{content:"\e024"}.glyphicon-download-alt:before{content:"\e025"}.glyphicon-download:before{content:"\e026"}.glyphicon-upload:before{content:"\e027"}.glyphicon-inbox:before{content:"\e028"}.glyphicon-play-circle:before{content:"\e029"}.glyphicon-repeat:before{content:"\e030"}.glyphicon-refresh:before{content:"\e031"}.glyphicon-list-alt:before{content:"\e032"}.glyphicon-lock:before{content:"\e033"}.glyphicon-flag:before{content:"\e034"}.glyphicon-headphones:before{content:"\e035"}.glyphicon-volume-off:before{content:"\e036"}.glyphicon-volume-down:before{content:"\e037"}.glyphicon-volume-up:before{content:"\e038"}.glyphicon-qrcode:before{content:"\e039"}.glyphicon-barcode:before{content:"\e040"}.glyphicon-tag:before{content:"\e041"}.glyphicon-tags:before{content:"\e042"}.glyphicon-book:before{content:"\e043"}.glyphicon-bookmark:before{content:"\e044"}.glyphicon-print:before{content:"\e045"}.glyphicon-camera:before{content:"\e046"}.glyphicon-font:before{content:"\e047"}.glyphicon-bold:before{content:"\e048"}.glyphicon-italic:before{content:"\e049"}.glyphicon-text-height:before{content:"\e050"}.glyphicon-text-width:before{content:"\e051"}.glyphicon-align-left:before{content:"\e052"}.glyphicon-align-center:before{content:"\e053"}.glyphicon-align-right:before{content:"\e054"}.glyphicon-align-justify:before{content:"\e055"}.glyphicon-list:before{content:"\e056"}.glyphicon-indent-left:before{content:"\e057"}.glyphicon-indent-right:before{content:"\e058"}.glyphicon-facetime-video:before{content:"\e059"}.glyphicon-picture:before{content:"\e060"}.glyphicon-map-marker:before{content:"\e062"}.glyphicon-adjust:before{content:"\e063"}.glyphicon-tint:before{content:"\e064"}.glyphicon-edit:before{content:"\e065"}.glyphicon-share:before{content:"\e066"}.glyphicon-check:before{content:"\e067"}.glyphicon-move:before{content:"\e068"}.glyphicon-step-backward:before{content:"\e069"}.glyphicon-fast-backward:before{content:"\e070"}.glyphicon-backward:before{content:"\e071"}.glyphicon-play:before{content:"\e072"}.glyphicon-pause:before{content:"\e073"}.glyphicon-stop:before{content:"\e074"}.glyphicon-forward:before{content:"\e075"}.glyphicon-fast-forward:before{content:"\e076"}.glyphicon-step-forward:before{content:"\e077"}.glyphicon-eject:before{content:"\e078"}.glyphicon-chevron-left:before{content:"\e079"}.glyphicon-chevron-right:before{content:"\e080"}.glyphicon-plus-sign:before{content:"\e081"}.glyphicon-minus-sign:before{content:"\e082"}.glyphicon-remove-sign:before{content:"\e083"}.glyphicon-ok-sign:before{content:"\e084"}.glyphicon-question-sign:before{content:"\e085"}.glyphicon-info-sign:before{content:"\e086"}.glyphicon-screenshot:before{content:"\e087"}.glyphicon-remove-circle:before{content:"\e088"}.glyphicon-ok-circle:before{content:"\e089"}.glyphicon-ban-circle:before{content:"\e090"}.glyphicon-arrow-left:before{content:"\e091"}.glyphicon-arrow-right:before{content:"\e092"}.glyphicon-arrow-up:before{content:"\e093"}.glyphicon-arrow-down:before{content:"\e094"}.glyphicon-share-alt:before{content:"\e095"}.glyphicon-resize-full:before{content:"\e096"}.glyphicon-resize-small:before{content:"\e097"}.glyphicon-exclamation-sign:before{content:"\e101"}.glyphicon-gift:before{content:"\e102"}.glyphicon-leaf:before{content:"\e103"}.glyphicon-fire:before{content:"\e104"}.glyphicon-eye-open:before{content:"\e105"}.glyphicon-eye-close:before{content:"\e106"}.glyphicon-warning-sign:before{content:"\e107"}.glyphicon-plane:before{content:"\e108"}.glyphicon-calendar:before{content:"\e109"}.glyphicon-random:before{content:"\e110"}.glyphicon-comment:before{content:"\e111"}.glyphicon-magnet:before{content:"\e112"}.glyphicon-chevron-up:before{content:"\e113"}.glyphicon-chevron-down:before{content:"\e114"}.glyphicon-retweet:before{content:"\e115"}.glyphicon-shopping-cart:before{content:"\e116"}.glyphicon-folder-close:before{content:"\e117"}.glyphicon-folder-open:before{content:"\e118"}.glyphicon-resize-vertical:before{content:"\e119"}.glyphicon-resize-horizontal:before{content:"\e120"}.glyphicon-hdd:before{content:"\e121"}.glyphicon-bullhorn:before{content:"\e122"}.glyphicon-bell:before{content:"\e123"}.glyphicon-certificate:before{content:"\e124"}.glyphicon-thumbs-up:before{content:"\e125"}.glyphicon-thumbs-down:before{content:"\e126"}.glyphicon-hand-right:before{content:"\e127"}.glyphicon-hand-left:before{content:"\e128"}.glyphicon-hand-up:before{content:"\e129"}.glyphicon-hand-down:before{content:"\e130"}.glyphicon-circle-arrow-right:before{content:"\e131"}.glyphicon-circle-arrow-left:before{content:"\e132"}.glyphicon-circle-arrow-up:before{content:"\e133"}.glyphicon-circle-arrow-down:before{content:"\e134"}.glyphicon-globe:before{content:"\e135"}.glyphicon-wrench:before{content:"\e136"}.glyphicon-tasks:before{content:"\e137"}.glyphicon-filter:before{content:"\e138"}.glyphicon-briefcase:before{content:"\e139"}.glyphicon-fullscreen:before{content:"\e140"}.glyphicon-dashboard:before{content:"\e141"}.glyphicon-paperclip:before{content:"\e142"}.glyphicon-heart-empty:before{content:"\e143"}.glyphicon-link:before{content:"\e144"}.glyphicon-phone:before{content:"\e145"}.glyphicon-pushpin:before{content:"\e146"}.glyphicon-usd:before{content:"\e148"}.glyphicon-gbp:before{content:"\e149"}.glyphicon-sort:before{content:"\e150"}.glyphicon-sort-by-alphabet:before{content:"\e151"}.glyphicon-sort-by-alphabet-alt:before{content:"\e152"}.glyphicon-sort-by-order:before{content:"\e153"}.glyphicon-sort-by-order-alt:before{content:"\e154"}.glyphicon-sort-by-attributes:before{content:"\e155"}.glyphicon-sort-by-attributes-alt:before{content:"\e156"}.glyphicon-unchecked:before{content:"\e157"}.glyphicon-expand:before{content:"\e158"}.glyphicon-collapse-down:before{content:"\e159"}.glyphicon-collapse-up:before{content:"\e160"}.glyphicon-log-in:before{content:"\e161"}.glyphicon-flash:before{content:"\e162"}.glyphicon-log-out:before{content:"\e163"}.glyphicon-new-window:before{content:"\e164"}.glyphicon-record:before{content:"\e165"}.glyphicon-save:before{content:"\e166"}.glyphicon-open:before{content:"\e167"}.glyphicon-saved:before{content:"\e168"}.glyphicon-import:before{content:"\e169"}.glyphicon-export:before{content:"\e170"}.glyphicon-send:before{content:"\e171"}.glyphicon-floppy-disk:before{content:"\e172"}.glyphicon-floppy-saved:before{content:"\e173"}.glyphicon-floppy-remove:before{content:"\e174"}.glyphicon-floppy-save:before{content:"\e175"}.glyphicon-floppy-open:before{content:"\e176"}.glyphicon-credit-card:before{content:"\e177"}.glyphicon-transfer:before{content:"\e178"}.glyphicon-cutlery:before{content:"\e179"}.glyphicon-header:before{content:"\e180"}.glyphicon-compressed:before{content:"\e181"}.glyphicon-earphone:before{content:"\e182"}.glyphicon-phone-alt:before{content:"\e183"}.glyphicon-tower:before{content:"\e184"}.glyphicon-stats:before{content:"\e185"}.glyphicon-sd-video:before{content:"\e186"}.glyphicon-hd-video:before{content:"\e187"}.glyphicon-subtitles:before{content:"\e188"}.glyphicon-sound-stereo:before{content:"\e189"}.glyphicon-sound-dolby:before{content:"\e190"}.glyphicon-sound-5-1:before{content:"\e191"}.glyphicon-sound-6-1:before{content:"\e192"}.glyphicon-sound-7-1:before{content:"\e193"}.glyphicon-copyright-mark:before{content:"\e194"}.glyphicon-registration-mark:before{content:"\e195"}.glyphicon-cloud-download:before{content:"\e197"}.glyphicon-cloud-upload:before{content:"\e198"}.glyphicon-tree-conifer:before{content:"\e199"}.glyphicon-tree-deciduous:before{content:"\e200"}*{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}*:before,*:after{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}html{font-size:10px;-webkit-tap-highlight-color:rgba(0,0,0,0)}body{font-family:"Open Sans","Helvetica Neue",Helvetica,Arial,sans-serif;font-size:14px;line-height:1.42857143;color:#666666;background-color:#ffffff}input,button,select,textarea{font-family:inherit;font-size:inherit;line-height:inherit}a{color:#3399f3;text-decoration:none}a:hover,a:focus{color:#3399f3;text-decoration:underline}a:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}figure{margin:0}img{vertical-align:middle}.img-responsive,.thumbnail>img,.thumbnail a>img,.carousel-inner>.item>img,.carousel-inner>.item>a>img{display:block;max-width:100%;height:auto}.img-rounded{border-radius:6px}.img-thumbnail{padding:4px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:all .2s ease-in-out;-o-transition:all .2s ease-in-out;transition:all .2s ease-in-out;display:inline-block;max-width:100%;height:auto}.img-circle{border-radius:50%}hr{margin-top:20px;margin-bottom:20px;border:0;border-top:1px solid #eeeeee}.sr-only{position:absolute;width:1px;height:1px;margin:-1px;padding:0;overflow:hidden;clip:rect(0, 0, 0, 0);border:0}.sr-only-focusable:active,.sr-only-focusable:focus{position:static;width:auto;height:auto;margin:0;overflow:visible;clip:auto}h1,h2,h3,h4,h5,h6,.h1,.h2,.h3,.h4,.h5,.h6{font-family:"Open Sans","Helvetica Neue",Helvetica,Arial,sans-serif;font-weight:500;line-height:1.1;color:#2d2d2d}h1 small,h2 small,h3 small,h4 small,h5 small,h6 small,.h1 small,.h2 small,.h3 small,.h4 small,.h5 small,.h6 small,h1 .small,h2 .small,h3 .small,h4 .small,h5 .small,h6 .small,.h1 .small,.h2 .small,.h3 .small,.h4 .small,.h5 .small,.h6 .small{font-weight:normal;line-height:1;color:#999999}h1,.h1,h2,.h2,h3,.h3{margin-top:20px;margin-bottom:10px}h1 small,.h1 small,h2 small,.h2 small,h3 small,.h3 small,h1 .small,.h1 .small,h2 .small,.h2 .small,h3 .small,.h3 .small{font-size:65%}h4,.h4,h5,.h5,h6,.h6{margin-top:10px;margin-bottom:10px}h4 small,.h4 small,h5 small,.h5 small,h6 small,.h6 small,h4 .small,.h4 .small,h5 .small,.h5 .small,h6 .small,.h6 .small{font-size:75%}h1,.h1{font-size:36px}h2,.h2{font-size:30px}h3,.h3{font-size:24px}h4,.h4{font-size:18px}h5,.h5{font-size:14px}h6,.h6{font-size:12px}p{margin:0 0 10px}.lead{margin-bottom:20px;font-size:16px;font-weight:300;line-height:1.4}@media (min-width:768px){.lead{font-size:21px}}small,.small{font-size:85%}mark,.mark{background-color:#fcf8e3;padding:.2em}.text-left{text-align:left}.text-right{text-align:right}.text-center{text-align:center}.text-justify{text-align:justify}.text-nowrap{white-space:nowrap}.text-lowercase{text-transform:lowercase}.text-uppercase{text-transform:uppercase}.text-capitalize{text-transform:capitalize}.text-muted{color:#999999}.text-primary{color:#446e9b}a.text-primary:hover{color:#345578}.text-success{color:#468847}a.text-success:hover{color:#356635}.text-info{color:#3a87ad}a.text-info:hover{color:#2d6987}.text-warning{color:#c09853}a.text-warning:hover{color:#a47e3c}.text-danger{color:#b94a48}a.text-danger:hover{color:#953b39}.bg-primary{color:#fff;background-color:#446e9b}a.bg-primary:hover{background-color:#345578}.bg-success{background-color:#dff0d8}a.bg-success:hover{background-color:#c1e2b3}.bg-info{background-color:#d9edf7}a.bg-info:hover{background-color:#afd9ee}.bg-warning{background-color:#fcf8e3}a.bg-warning:hover{background-color:#f7ecb5}.bg-danger{background-color:#f2dede}a.bg-danger:hover{background-color:#e4b9b9}.page-header{padding-bottom:9px;margin:40px 0 20px;border-bottom:1px solid #eeeeee}ul,ol{margin-top:0;margin-bottom:10px}ul ul,ol ul,ul ol,ol ol{margin-bottom:0}.list-unstyled{padding-left:0;list-style:none}.list-inline{padding-left:0;list-style:none;margin-left:-5px}.list-inline>li{display:inline-block;padding-left:5px;padding-right:5px}dl{margin-top:0;margin-bottom:20px}dt,dd{line-height:1.42857143}dt{font-weight:bold}dd{margin-left:0}@media (min-width:768px){.dl-horizontal dt{float:left;width:160px;clear:left;text-align:right;overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.dl-horizontal dd{margin-left:180px}}abbr[title],abbr[data-original-title]{cursor:help;border-bottom:1px dotted #999999}.initialism{font-size:90%;text-transform:uppercase}blockquote{padding:10px 20px;margin:0 0 20px;font-size:17.5px;border-left:5px solid #eeeeee}blockquote p:last-child,blockquote ul:last-child,blockquote ol:last-child{margin-bottom:0}blockquote footer,blockquote small,blockquote .small{display:block;font-size:80%;line-height:1.42857143;color:#999999}blockquote footer:before,blockquote small:before,blockquote .small:before{content:'\2014 \00A0'}.blockquote-reverse,blockquote.pull-right{padding-right:15px;padding-left:0;border-right:5px solid #eeeeee;border-left:0;text-align:right}.blockquote-reverse footer:before,blockquote.pull-right footer:before,.blockquote-reverse small:before,blockquote.pull-right small:before,.blockquote-reverse .small:before,blockquote.pull-right .small:before{content:''}.blockquote-reverse footer:after,blockquote.pull-right footer:after,.blockquote-reverse small:after,blockquote.pull-right small:after,.blockquote-reverse .small:after,blockquote.pull-right .small:after{content:'\00A0 \2014'}address{margin-bottom:20px;font-style:normal;line-height:1.42857143}code,kbd,pre,samp{font-family:monospace}code{padding:2px 4px;font-size:90%;color:#c7254e;background-color:#f9f2f4;border-radius:4px}kbd{padding:2px 4px;font-size:90%;color:#ffffff;background-color:#333333;border-radius:3px;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25)}kbd kbd{padding:0;font-size:100%;font-weight:bold;-webkit-box-shadow:none;box-shadow:none}pre{display:block;padding:9.5px;margin:0 0 10px;font-size:13px;line-height:1.42857143;word-break:break-all;word-wrap:break-word;color:#333333;background-color:#f5f5f5;border:1px solid #cccccc;border-radius:4px}pre code{padding:0;font-size:inherit;color:inherit;white-space:pre-wrap;background-color:transparent;border-radius:0}.pre-scrollable{max-height:340px;overflow-y:scroll}.container{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}@media (min-width:768px){.container{width:750px}}@media (min-width:992px){.container{width:970px}}@media (min-width:1200px){.container{width:1170px}}.container-fluid{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}.row{margin-left:-15px;margin-right:-15px}.col-xs-1,.col-sm-1,.col-md-1,.col-lg-1,.col-xs-2,.col-sm-2,.col-md-2,.col-lg-2,.col-xs-3,.col-sm-3,.col-md-3,.col-lg-3,.col-xs-4,.col-sm-4,.col-md-4,.col-lg-4,.col-xs-5,.col-sm-5,.col-md-5,.col-lg-5,.col-xs-6,.col-sm-6,.col-md-6,.col-lg-6,.col-xs-7,.col-sm-7,.col-md-7,.col-lg-7,.col-xs-8,.col-sm-8,.col-md-8,.col-lg-8,.col-xs-9,.col-sm-9,.col-md-9,.col-lg-9,.col-xs-10,.col-sm-10,.col-md-10,.col-lg-10,.col-xs-11,.col-sm-11,.col-md-11,.col-lg-11,.col-xs-12,.col-sm-12,.col-md-12,.col-lg-12{position:relative;min-height:1px;padding-left:15px;padding-right:15px}.col-xs-1,.col-xs-2,.col-xs-3,.col-xs-4,.col-xs-5,.col-xs-6,.col-xs-7,.col-xs-8,.col-xs-9,.col-xs-10,.col-xs-11,.col-xs-12{float:left}.col-xs-12{width:100%}.col-xs-11{width:91.66666667%}.col-xs-10{width:83.33333333%}.col-xs-9{width:75%}.col-xs-8{width:66.66666667%}.col-xs-7{width:58.33333333%}.col-xs-6{width:50%}.col-xs-5{width:41.66666667%}.col-xs-4{width:33.33333333%}.col-xs-3{width:25%}.col-xs-2{width:16.66666667%}.col-xs-1{width:8.33333333%}.col-xs-pull-12{right:100%}.col-xs-pull-11{right:91.66666667%}.col-xs-pull-10{right:83.33333333%}.col-xs-pull-9{right:75%}.col-xs-pull-8{right:66.66666667%}.col-xs-pull-7{right:58.33333333%}.col-xs-pull-6{right:50%}.col-xs-pull-5{right:41.66666667%}.col-xs-pull-4{right:33.33333333%}.col-xs-pull-3{right:25%}.col-xs-pull-2{right:16.66666667%}.col-xs-pull-1{right:8.33333333%}.col-xs-pull-0{right:auto}.col-xs-push-12{left:100%}.col-xs-push-11{left:91.66666667%}.col-xs-push-10{left:83.33333333%}.col-xs-push-9{left:75%}.col-xs-push-8{left:66.66666667%}.col-xs-push-7{left:58.33333333%}.col-xs-push-6{left:50%}.col-xs-push-5{left:41.66666667%}.col-xs-push-4{left:33.33333333%}.col-xs-push-3{left:25%}.col-xs-push-2{left:16.66666667%}.col-xs-push-1{left:8.33333333%}.col-xs-push-0{left:auto}.col-xs-offset-12{margin-left:100%}.col-xs-offset-11{margin-left:91.66666667%}.col-xs-offset-10{margin-left:83.33333333%}.col-xs-offset-9{margin-left:75%}.col-xs-offset-8{margin-left:66.66666667%}.col-xs-offset-7{margin-left:58.33333333%}.col-xs-offset-6{margin-left:50%}.col-xs-offset-5{margin-left:41.66666667%}.col-xs-offset-4{margin-left:33.33333333%}.col-xs-offset-3{margin-left:25%}.col-xs-offset-2{margin-left:16.66666667%}.col-xs-offset-1{margin-left:8.33333333%}.col-xs-offset-0{margin-left:0%}@media (min-width:768px){.col-sm-1,.col-sm-2,.col-sm-3,.col-sm-4,.col-sm-5,.col-sm-6,.col-sm-7,.col-sm-8,.col-sm-9,.col-sm-10,.col-sm-11,.col-sm-12{float:left}.col-sm-12{width:100%}.col-sm-11{width:91.66666667%}.col-sm-10{width:83.33333333%}.col-sm-9{width:75%}.col-sm-8{width:66.66666667%}.col-sm-7{width:58.33333333%}.col-sm-6{width:50%}.col-sm-5{width:41.66666667%}.col-sm-4{width:33.33333333%}.col-sm-3{width:25%}.col-sm-2{width:16.66666667%}.col-sm-1{width:8.33333333%}.col-sm-pull-12{right:100%}.col-sm-pull-11{right:91.66666667%}.col-sm-pull-10{right:83.33333333%}.col-sm-pull-9{right:75%}.col-sm-pull-8{right:66.66666667%}.col-sm-pull-7{right:58.33333333%}.col-sm-pull-6{right:50%}.col-sm-pull-5{right:41.66666667%}.col-sm-pull-4{right:33.33333333%}.col-sm-pull-3{right:25%}.col-sm-pull-2{right:16.66666667%}.col-sm-pull-1{right:8.33333333%}.col-sm-pull-0{right:auto}.col-sm-push-12{left:100%}.col-sm-push-11{left:91.66666667%}.col-sm-push-10{left:83.33333333%}.col-sm-push-9{left:75%}.col-sm-push-8{left:66.66666667%}.col-sm-push-7{left:58.33333333%}.col-sm-push-6{left:50%}.col-sm-push-5{left:41.66666667%}.col-sm-push-4{left:33.33333333%}.col-sm-push-3{left:25%}.col-sm-push-2{left:16.66666667%}.col-sm-push-1{left:8.33333333%}.col-sm-push-0{left:auto}.col-sm-offset-12{margin-left:100%}.col-sm-offset-11{margin-left:91.66666667%}.col-sm-offset-10{margin-left:83.33333333%}.col-sm-offset-9{margin-left:75%}.col-sm-offset-8{margin-left:66.66666667%}.col-sm-offset-7{margin-left:58.33333333%}.col-sm-offset-6{margin-left:50%}.col-sm-offset-5{margin-left:41.66666667%}.col-sm-offset-4{margin-left:33.33333333%}.col-sm-offset-3{margin-left:25%}.col-sm-offset-2{margin-left:16.66666667%}.col-sm-offset-1{margin-left:8.33333333%}.col-sm-offset-0{margin-left:0%}}@media (min-width:992px){.col-md-1,.col-md-2,.col-md-3,.col-md-4,.col-md-5,.col-md-6,.col-md-7,.col-md-8,.col-md-9,.col-md-10,.col-md-11,.col-md-12{float:left}.col-md-12{width:100%}.col-md-11{width:91.66666667%}.col-md-10{width:83.33333333%}.col-md-9{width:75%}.col-md-8{width:66.66666667%}.col-md-7{width:58.33333333%}.col-md-6{width:50%}.col-md-5{width:41.66666667%}.col-md-4{width:33.33333333%}.col-md-3{width:25%}.col-md-2{width:16.66666667%}.col-md-1{width:8.33333333%}.col-md-pull-12{right:100%}.col-md-pull-11{right:91.66666667%}.col-md-pull-10{right:83.33333333%}.col-md-pull-9{right:75%}.col-md-pull-8{right:66.66666667%}.col-md-pull-7{right:58.33333333%}.col-md-pull-6{right:50%}.col-md-pull-5{right:41.66666667%}.col-md-pull-4{right:33.33333333%}.col-md-pull-3{right:25%}.col-md-pull-2{right:16.66666667%}.col-md-pull-1{right:8.33333333%}.col-md-pull-0{right:auto}.col-md-push-12{left:100%}.col-md-push-11{left:91.66666667%}.col-md-push-10{left:83.33333333%}.col-md-push-9{left:75%}.col-md-push-8{left:66.66666667%}.col-md-push-7{left:58.33333333%}.col-md-push-6{left:50%}.col-md-push-5{left:41.66666667%}.col-md-push-4{left:33.33333333%}.col-md-push-3{left:25%}.col-md-push-2{left:16.66666667%}.col-md-push-1{left:8.33333333%}.col-md-push-0{left:auto}.col-md-offset-12{margin-left:100%}.col-md-offset-11{margin-left:91.66666667%}.col-md-offset-10{margin-left:83.33333333%}.col-md-offset-9{margin-left:75%}.col-md-offset-8{margin-left:66.66666667%}.col-md-offset-7{margin-left:58.33333333%}.col-md-offset-6{margin-left:50%}.col-md-offset-5{margin-left:41.66666667%}.col-md-offset-4{margin-left:33.33333333%}.col-md-offset-3{margin-left:25%}.col-md-offset-2{margin-left:16.66666667%}.col-md-offset-1{margin-left:8.33333333%}.col-md-offset-0{margin-left:0%}}@media (min-width:1200px){.col-lg-1,.col-lg-2,.col-lg-3,.col-lg-4,.col-lg-5,.col-lg-6,.col-lg-7,.col-lg-8,.col-lg-9,.col-lg-10,.col-lg-11,.col-lg-12{float:left}.col-lg-12{width:100%}.col-lg-11{width:91.66666667%}.col-lg-10{width:83.33333333%}.col-lg-9{width:75%}.col-lg-8{width:66.66666667%}.col-lg-7{width:58.33333333%}.col-lg-6{width:50%}.col-lg-5{width:41.66666667%}.col-lg-4{width:33.33333333%}.col-lg-3{width:25%}.col-lg-2{width:16.66666667%}.col-lg-1{width:8.33333333%}.col-lg-pull-12{right:100%}.col-lg-pull-11{right:91.66666667%}.col-lg-pull-10{right:83.33333333%}.col-lg-pull-9{right:75%}.col-lg-pull-8{right:66.66666667%}.col-lg-pull-7{right:58.33333333%}.col-lg-pull-6{right:50%}.col-lg-pull-5{right:41.66666667%}.col-lg-pull-4{right:33.33333333%}.col-lg-pull-3{right:25%}.col-lg-pull-2{right:16.66666667%}.col-lg-pull-1{right:8.33333333%}.col-lg-pull-0{right:auto}.col-lg-push-12{left:100%}.col-lg-push-11{left:91.66666667%}.col-lg-push-10{left:83.33333333%}.col-lg-push-9{left:75%}.col-lg-push-8{left:66.66666667%}.col-lg-push-7{left:58.33333333%}.col-lg-push-6{left:50%}.col-lg-push-5{left:41.66666667%}.col-lg-push-4{left:33.33333333%}.col-lg-push-3{left:25%}.col-lg-push-2{left:16.66666667%}.col-lg-push-1{left:8.33333333%}.col-lg-push-0{left:auto}.col-lg-offset-12{margin-left:100%}.col-lg-offset-11{margin-left:91.66666667%}.col-lg-offset-10{margin-left:83.33333333%}.col-lg-offset-9{margin-left:75%}.col-lg-offset-8{margin-left:66.66666667%}.col-lg-offset-7{margin-left:58.33333333%}.col-lg-offset-6{margin-left:50%}.col-lg-offset-5{margin-left:41.66666667%}.col-lg-offset-4{margin-left:33.33333333%}.col-lg-offset-3{margin-left:25%}.col-lg-offset-2{margin-left:16.66666667%}.col-lg-offset-1{margin-left:8.33333333%}.col-lg-offset-0{margin-left:0%}}table{background-color:transparent}caption{padding-top:8px;padding-bottom:8px;color:#999999;text-align:left}th{}.table{width:100%;max-width:100%;margin-bottom:20px}.table>thead>tr>th,.table>tbody>tr>th,.table>tfoot>tr>th,.table>thead>tr>td,.table>tbody>tr>td,.table>tfoot>tr>td{padding:8px;line-height:1.42857143;vertical-align:top;border-top:1px solid #dddddd}.table>thead>tr>th{vertical-align:bottom;border-bottom:2px solid #dddddd}.table>caption+thead>tr:first-child>th,.table>colgroup+thead>tr:first-child>th,.table>thead:first-child>tr:first-child>th,.table>caption+thead>tr:first-child>td,.table>colgroup+thead>tr:first-child>td,.table>thead:first-child>tr:first-child>td{border-top:0}.table>tbody+tbody{border-top:2px solid #dddddd}.table .table{background-color:#ffffff}.table-condensed>thead>tr>th,.table-condensed>tbody>tr>th,.table-condensed>tfoot>tr>th,.table-condensed>thead>tr>td,.table-condensed>tbody>tr>td,.table-condensed>tfoot>tr>td{padding:5px}.table-bordered{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>tbody>tr>th,.table-bordered>tfoot>tr>th,.table-bordered>thead>tr>td,.table-bordered>tbody>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>thead>tr>td{border-bottom-width:2px}.table-striped>tbody>tr:nth-child(odd){background-color:#f9f9f9}.table-hover>tbody>tr:hover{background-color:#f5f5f5}table col[class*="col-"]{position:static;float:none;display:table-column}table td[class*="col-"],table th[class*="col-"]{position:static;float:none;display:table-cell}.table>thead>tr>td.active,.table>tbody>tr>td.active,.table>tfoot>tr>td.active,.table>thead>tr>th.active,.table>tbody>tr>th.active,.table>tfoot>tr>th.active,.table>thead>tr.active>td,.table>tbody>tr.active>td,.table>tfoot>tr.active>td,.table>thead>tr.active>th,.table>tbody>tr.active>th,.table>tfoot>tr.active>th{background-color:#f5f5f5}.table-hover>tbody>tr>td.active:hover,.table-hover>tbody>tr>th.active:hover,.table-hover>tbody>tr.active:hover>td,.table-hover>tbody>tr:hover>.active,.table-hover>tbody>tr.active:hover>th{background-color:#e8e8e8}.table>thead>tr>td.success,.table>tbody>tr>td.success,.table>tfoot>tr>td.success,.table>thead>tr>th.success,.table>tbody>tr>th.success,.table>tfoot>tr>th.success,.table>thead>tr.success>td,.table>tbody>tr.success>td,.table>tfoot>tr.success>td,.table>thead>tr.success>th,.table>tbody>tr.success>th,.table>tfoot>tr.success>th{background-color:#dff0d8}.table-hover>tbody>tr>td.success:hover,.table-hover>tbody>tr>th.success:hover,.table-hover>tbody>tr.success:hover>td,.table-hover>tbody>tr:hover>.success,.table-hover>tbody>tr.success:hover>th{background-color:#d0e9c6}.table>thead>tr>td.info,.table>tbody>tr>td.info,.table>tfoot>tr>td.info,.table>thead>tr>th.info,.table>tbody>tr>th.info,.table>tfoot>tr>th.info,.table>thead>tr.info>td,.table>tbody>tr.info>td,.table>tfoot>tr.info>td,.table>thead>tr.info>th,.table>tbody>tr.info>th,.table>tfoot>tr.info>th{background-color:#d9edf7}.table-hover>tbody>tr>td.info:hover,.table-hover>tbody>tr>th.info:hover,.table-hover>tbody>tr.info:hover>td,.table-hover>tbody>tr:hover>.info,.table-hover>tbody>tr.info:hover>th{background-color:#c4e3f3}.table>thead>tr>td.warning,.table>tbody>tr>td.warning,.table>tfoot>tr>td.warning,.table>thead>tr>th.warning,.table>tbody>tr>th.warning,.table>tfoot>tr>th.warning,.table>thead>tr.warning>td,.table>tbody>tr.warning>td,.table>tfoot>tr.warning>td,.table>thead>tr.warning>th,.table>tbody>tr.warning>th,.table>tfoot>tr.warning>th{background-color:#fcf8e3}.table-hover>tbody>tr>td.warning:hover,.table-hover>tbody>tr>th.warning:hover,.table-hover>tbody>tr.warning:hover>td,.table-hover>tbody>tr:hover>.warning,.table-hover>tbody>tr.warning:hover>th{background-color:#faf2cc}.table>thead>tr>td.danger,.table>tbody>tr>td.danger,.table>tfoot>tr>td.danger,.table>thead>tr>th.danger,.table>tbody>tr>th.danger,.table>tfoot>tr>th.danger,.table>thead>tr.danger>td,.table>tbody>tr.danger>td,.table>tfoot>tr.danger>td,.table>thead>tr.danger>th,.table>tbody>tr.danger>th,.table>tfoot>tr.danger>th{background-color:#f2dede}.table-hover>tbody>tr>td.danger:hover,.table-hover>tbody>tr>th.danger:hover,.table-hover>tbody>tr.danger:hover>td,.table-hover>tbody>tr:hover>.danger,.table-hover>tbody>tr.danger:hover>th{background-color:#ebcccc}.table-responsive{overflow-x:auto;min-height:0.01%}@media screen and (max-width:767px){.table-responsive{width:100%;margin-bottom:15px;overflow-y:hidden;-ms-overflow-style:-ms-autohiding-scrollbar;border:1px solid #dddddd}.table-responsive>.table{margin-bottom:0}.table-responsive>.table>thead>tr>th,.table-responsive>.table>tbody>tr>th,.table-responsive>.table>tfoot>tr>th,.table-responsive>.table>thead>tr>td,.table-responsive>.table>tbody>tr>td,.table-responsive>.table>tfoot>tr>td{white-space:nowrap}.table-responsive>.table-bordered{border:0}.table-responsive>.table-bordered>thead>tr>th:first-child,.table-responsive>.table-bordered>tbody>tr>th:first-child,.table-responsive>.table-bordered>tfoot>tr>th:first-child,.table-responsive>.table-bordered>thead>tr>td:first-child,.table-responsive>.table-bordered>tbody>tr>td:first-child,.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.table-responsive>.table-bordered>thead>tr>th:last-child,.table-responsive>.table-bordered>tbody>tr>th:last-child,.table-responsive>.table-bordered>tfoot>tr>th:last-child,.table-responsive>.table-bordered>thead>tr>td:last-child,.table-responsive>.table-bordered>tbody>tr>td:last-child,.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.table-responsive>.table-bordered>tbody>tr:last-child>th,.table-responsive>.table-bordered>tfoot>tr:last-child>th,.table-responsive>.table-bordered>tbody>tr:last-child>td,.table-responsive>.table-bordered>tfoot>tr:last-child>td{border-bottom:0}}fieldset{padding:0;margin:0;border:0;min-width:0}legend{display:block;width:100%;padding:0;margin-bottom:20px;font-size:21px;line-height:inherit;color:#666666;border:0;border-bottom:1px solid #e5e5e5}label{display:inline-block;max-width:100%;margin-bottom:5px;font-weight:bold}input[type="search"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}input[type="radio"],input[type="checkbox"]{margin:4px 0 0;margin-top:1px \9;line-height:normal}input[type="file"]{display:block}input[type="range"]{display:block;width:100%}select[multiple],select[size]{height:auto}input[type="file"]:focus,input[type="radio"]:focus,input[type="checkbox"]:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}output{display:block;padding-top:9px;font-size:14px;line-height:1.42857143;color:#666666}.form-control{display:block;width:100%;height:38px;padding:8px 12px;font-size:14px;line-height:1.42857143;color:#666666;background-color:#ffffff;background-image:none;border:1px solid #cccccc;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);-webkit-transition:border-color ease-in-out .15s,-webkit-box-shadow ease-in-out .15s;-o-transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s;transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s}.form-control:focus{border-color:#66afe9;outline:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6)}.form-control::-moz-placeholder{color:#999999;opacity:1}.form-control:-ms-input-placeholder{color:#999999}.form-control::-webkit-input-placeholder{color:#999999}.form-control[disabled],.form-control[readonly],fieldset[disabled] .form-control{cursor:not-allowed;background-color:#eeeeee;opacity:1}textarea.form-control{height:auto}input[type="search"]{-webkit-appearance:none}@media screen and (-webkit-min-device-pixel-ratio:0){input[type="date"],input[type="time"],input[type="datetime-local"],input[type="month"]{line-height:38px}input[type="date"].input-sm,input[type="time"].input-sm,input[type="datetime-local"].input-sm,input[type="month"].input-sm{line-height:30px}input[type="date"].input-lg,input[type="time"].input-lg,input[type="datetime-local"].input-lg,input[type="month"].input-lg{line-height:54px}}.form-group{margin-bottom:15px}.radio,.checkbox{position:relative;display:block;margin-top:10px;margin-bottom:10px}.radio label,.checkbox label{min-height:20px;padding-left:20px;margin-bottom:0;font-weight:normal;cursor:pointer}.radio input[type="radio"],.radio-inline input[type="radio"],.checkbox input[type="checkbox"],.checkbox-inline input[type="checkbox"]{position:absolute;margin-left:-20px;margin-top:4px \9}.radio+.radio,.checkbox+.checkbox{margin-top:-5px}.radio-inline,.checkbox-inline{display:inline-block;padding-left:20px;margin-bottom:0;vertical-align:middle;font-weight:normal;cursor:pointer}.radio-inline+.radio-inline,.checkbox-inline+.checkbox-inline{margin-top:0;margin-left:10px}input[type="radio"][disabled],input[type="checkbox"][disabled],input[type="radio"].disabled,input[type="checkbox"].disabled,fieldset[disabled] input[type="radio"],fieldset[disabled] input[type="checkbox"]{cursor:not-allowed}.radio-inline.disabled,.checkbox-inline.disabled,fieldset[disabled] .radio-inline,fieldset[disabled] .checkbox-inline{cursor:not-allowed}.radio.disabled label,.checkbox.disabled label,fieldset[disabled] .radio label,fieldset[disabled] .checkbox label{cursor:not-allowed}.form-control-static{padding-top:9px;padding-bottom:9px;margin-bottom:0}.form-control-static.input-lg,.form-control-static.input-sm{padding-left:0;padding-right:0}.input-sm,.form-group-sm .form-control{height:30px;padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}select.input-sm,select.form-group-sm .form-control{height:30px;line-height:30px}textarea.input-sm,textarea.form-group-sm .form-control,select[multiple].input-sm,select[multiple].form-group-sm .form-control{height:auto}.input-lg,.form-group-lg .form-control{height:54px;padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}select.input-lg,select.form-group-lg .form-control{height:54px;line-height:54px}textarea.input-lg,textarea.form-group-lg .form-control,select[multiple].input-lg,select[multiple].form-group-lg .form-control{height:auto}.has-feedback{position:relative}.has-feedback .form-control{padding-right:47.5px}.form-control-feedback{position:absolute;top:0;right:0;z-index:2;display:block;width:38px;height:38px;line-height:38px;text-align:center;pointer-events:none}.input-lg+.form-control-feedback{width:54px;height:54px;line-height:54px}.input-sm+.form-control-feedback{width:30px;height:30px;line-height:30px}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success.radio label,.has-success.checkbox label,.has-success.radio-inline label,.has-success.checkbox-inline label{color:#468847}.has-success .form-control{border-color:#468847;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-success .form-control:focus{border-color:#356635;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #7aba7b;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #7aba7b}.has-success .input-group-addon{color:#468847;border-color:#468847;background-color:#dff0d8}.has-success .form-control-feedback{color:#468847}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning.radio label,.has-warning.checkbox label,.has-warning.radio-inline label,.has-warning.checkbox-inline label{color:#c09853}.has-warning .form-control{border-color:#c09853;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-warning .form-control:focus{border-color:#a47e3c;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #dbc59e;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #dbc59e}.has-warning .input-group-addon{color:#c09853;border-color:#c09853;background-color:#fcf8e3}.has-warning .form-control-feedback{color:#c09853}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error.radio label,.has-error.checkbox label,.has-error.radio-inline label,.has-error.checkbox-inline label{color:#b94a48}.has-error .form-control{border-color:#b94a48;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-error .form-control:focus{border-color:#953b39;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #d59392;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #d59392}.has-error .input-group-addon{color:#b94a48;border-color:#b94a48;background-color:#f2dede}.has-error .form-control-feedback{color:#b94a48}.has-feedback label~.form-control-feedback{top:25px}.has-feedback label.sr-only~.form-control-feedback{top:0}.help-block{display:block;margin-top:5px;margin-bottom:10px;color:#a6a6a6}@media (min-width:768px){.form-inline .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.form-inline .form-control{display:inline-block;width:auto;vertical-align:middle}.form-inline .form-control-static{display:inline-block}.form-inline .input-group{display:inline-table;vertical-align:middle}.form-inline .input-group .input-group-addon,.form-inline .input-group .input-group-btn,.form-inline .input-group .form-control{width:auto}.form-inline .input-group>.form-control{width:100%}.form-inline .control-label{margin-bottom:0;vertical-align:middle}.form-inline .radio,.form-inline .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.form-inline .radio label,.form-inline .checkbox label{padding-left:0}.form-inline .radio input[type="radio"],.form-inline .checkbox input[type="checkbox"]{position:relative;margin-left:0}.form-inline .has-feedback .form-control-feedback{top:0}}.form-horizontal .radio,.form-horizontal .checkbox,.form-horizontal .radio-inline,.form-horizontal .checkbox-inline{margin-top:0;margin-bottom:0;padding-top:9px}.form-horizontal .radio,.form-horizontal .checkbox{min-height:29px}.form-horizontal .form-group{margin-left:-15px;margin-right:-15px}@media (min-width:768px){.form-horizontal .control-label{text-align:right;margin-bottom:0;padding-top:9px}}.form-horizontal .has-feedback .form-control-feedback{right:15px}@media (min-width:768px){.form-horizontal .form-group-lg .control-label{padding-top:19.62px}}@media (min-width:768px){.form-horizontal .form-group-sm .control-label{padding-top:6px}}.btn{display:inline-block;margin-bottom:0;font-weight:normal;text-align:center;vertical-align:middle;-ms-touch-action:manipulation;touch-action:manipulation;cursor:pointer;background-image:none;border:1px solid transparent;white-space:nowrap;padding:8px 12px;font-size:14px;line-height:1.42857143;border-radius:4px;-webkit-user-select:none;-moz-user-select:none;-ms-user-select:none;user-select:none}.btn:focus,.btn:active:focus,.btn.active:focus,.btn.focus,.btn:active.focus,.btn.active.focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}.btn:hover,.btn:focus,.btn.focus{color:#ffffff;text-decoration:none}.btn:active,.btn.active{outline:0;background-image:none;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn.disabled,.btn[disabled],fieldset[disabled] .btn{cursor:not-allowed;pointer-events:none;opacity:0.65;filter:alpha(opacity=65);-webkit-box-shadow:none;box-shadow:none}.btn-default{color:#ffffff;background-color:#474949;border-color:#474949}.btn-default:hover,.btn-default:focus,.btn-default.focus,.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{color:#ffffff;background-color:#2e2f2f;border-color:#292a2a}.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{background-image:none}.btn-default.disabled,.btn-default[disabled],fieldset[disabled] .btn-default,.btn-default.disabled:hover,.btn-default[disabled]:hover,fieldset[disabled] .btn-default:hover,.btn-default.disabled:focus,.btn-default[disabled]:focus,fieldset[disabled] .btn-default:focus,.btn-default.disabled.focus,.btn-default[disabled].focus,fieldset[disabled] .btn-default.focus,.btn-default.disabled:active,.btn-default[disabled]:active,fieldset[disabled] .btn-default:active,.btn-default.disabled.active,.btn-default[disabled].active,fieldset[disabled] .btn-default.active{background-color:#474949;border-color:#474949}.btn-default .badge{color:#474949;background-color:#ffffff}.btn-primary{color:#ffffff;background-color:#446e9b;border-color:#446e9b}.btn-primary:hover,.btn-primary:focus,.btn-primary.focus,.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{color:#ffffff;background-color:#345578;border-color:#315070}.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{background-image:none}.btn-primary.disabled,.btn-primary[disabled],fieldset[disabled] .btn-primary,.btn-primary.disabled:hover,.btn-primary[disabled]:hover,fieldset[disabled] .btn-primary:hover,.btn-primary.disabled:focus,.btn-primary[disabled]:focus,fieldset[disabled] .btn-primary:focus,.btn-primary.disabled.focus,.btn-primary[disabled].focus,fieldset[disabled] .btn-primary.focus,.btn-primary.disabled:active,.btn-primary[disabled]:active,fieldset[disabled] .btn-primary:active,.btn-primary.disabled.active,.btn-primary[disabled].active,fieldset[disabled] .btn-primary.active{background-color:#446e9b;border-color:#446e9b}.btn-primary .badge{color:#446e9b;background-color:#ffffff}.btn-success{color:#ffffff;background-color:#3cb521;border-color:#3cb521}.btn-success:hover,.btn-success:focus,.btn-success.focus,.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{color:#ffffff;background-color:#2e8a19;border-color:#2b8118}.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{background-image:none}.btn-success.disabled,.btn-success[disabled],fieldset[disabled] .btn-success,.btn-success.disabled:hover,.btn-success[disabled]:hover,fieldset[disabled] .btn-success:hover,.btn-success.disabled:focus,.btn-success[disabled]:focus,fieldset[disabled] .btn-success:focus,.btn-success.disabled.focus,.btn-success[disabled].focus,fieldset[disabled] .btn-success.focus,.btn-success.disabled:active,.btn-success[disabled]:active,fieldset[disabled] .btn-success:active,.btn-success.disabled.active,.btn-success[disabled].active,fieldset[disabled] .btn-success.active{background-color:#3cb521;border-color:#3cb521}.btn-success .badge{color:#3cb521;background-color:#ffffff}.btn-info{color:#ffffff;background-color:#3399f3;border-color:#3399f3}.btn-info:hover,.btn-info:focus,.btn-info.focus,.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{color:#ffffff;background-color:#0e80e5;border-color:#0d7bdc}.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{background-image:none}.btn-info.disabled,.btn-info[disabled],fieldset[disabled] .btn-info,.btn-info.disabled:hover,.btn-info[disabled]:hover,fieldset[disabled] .btn-info:hover,.btn-info.disabled:focus,.btn-info[disabled]:focus,fieldset[disabled] .btn-info:focus,.btn-info.disabled.focus,.btn-info[disabled].focus,fieldset[disabled] .btn-info.focus,.btn-info.disabled:active,.btn-info[disabled]:active,fieldset[disabled] .btn-info:active,.btn-info.disabled.active,.btn-info[disabled].active,fieldset[disabled] .btn-info.active{background-color:#3399f3;border-color:#3399f3}.btn-info .badge{color:#3399f3;background-color:#ffffff}.btn-warning{color:#ffffff;background-color:#d47500;border-color:#d47500}.btn-warning:hover,.btn-warning:focus,.btn-warning.focus,.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{color:#ffffff;background-color:#a15900;border-color:#975300}.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{background-image:none}.btn-warning.disabled,.btn-warning[disabled],fieldset[disabled] .btn-warning,.btn-warning.disabled:hover,.btn-warning[disabled]:hover,fieldset[disabled] .btn-warning:hover,.btn-warning.disabled:focus,.btn-warning[disabled]:focus,fieldset[disabled] .btn-warning:focus,.btn-warning.disabled.focus,.btn-warning[disabled].focus,fieldset[disabled] .btn-warning.focus,.btn-warning.disabled:active,.btn-warning[disabled]:active,fieldset[disabled] .btn-warning:active,.btn-warning.disabled.active,.btn-warning[disabled].active,fieldset[disabled] .btn-warning.active{background-color:#d47500;border-color:#d47500}.btn-warning .badge{color:#d47500;background-color:#ffffff}.btn-danger{color:#ffffff;background-color:#cd0200;border-color:#cd0200}.btn-danger:hover,.btn-danger:focus,.btn-danger.focus,.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{color:#ffffff;background-color:#9a0200;border-color:#900100}.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{background-image:none}.btn-danger.disabled,.btn-danger[disabled],fieldset[disabled] .btn-danger,.btn-danger.disabled:hover,.btn-danger[disabled]:hover,fieldset[disabled] .btn-danger:hover,.btn-danger.disabled:focus,.btn-danger[disabled]:focus,fieldset[disabled] .btn-danger:focus,.btn-danger.disabled.focus,.btn-danger[disabled].focus,fieldset[disabled] .btn-danger.focus,.btn-danger.disabled:active,.btn-danger[disabled]:active,fieldset[disabled] .btn-danger:active,.btn-danger.disabled.active,.btn-danger[disabled].active,fieldset[disabled] .btn-danger.active{background-color:#cd0200;border-color:#cd0200}.btn-danger .badge{color:#cd0200;background-color:#ffffff}.btn-link{color:#3399f3;font-weight:normal;border-radius:0}.btn-link,.btn-link:active,.btn-link.active,.btn-link[disabled],fieldset[disabled] .btn-link{background-color:transparent;-webkit-box-shadow:none;box-shadow:none}.btn-link,.btn-link:hover,.btn-link:focus,.btn-link:active{border-color:transparent}.btn-link:hover,.btn-link:focus{color:#3399f3;text-decoration:underline;background-color:transparent}.btn-link[disabled]:hover,fieldset[disabled] .btn-link:hover,.btn-link[disabled]:focus,fieldset[disabled] .btn-link:focus{color:#999999;text-decoration:none}.btn-lg,.btn-group-lg>.btn{padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}.btn-sm,.btn-group-sm>.btn{padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}.btn-xs,.btn-group-xs>.btn{padding:1px 5px;font-size:12px;line-height:1.5;border-radius:3px}.btn-block{display:block;width:100%}.btn-block+.btn-block{margin-top:5px}input[type="submit"].btn-block,input[type="reset"].btn-block,input[type="button"].btn-block{width:100%}.fade{opacity:0;-webkit-transition:opacity 0.15s linear;-o-transition:opacity 0.15s linear;transition:opacity 0.15s linear}.fade.in{opacity:1}.collapse{display:none;visibility:hidden}.collapse.in{display:block;visibility:visible}tr.collapse.in{display:table-row}tbody.collapse.in{display:table-row-group}.collapsing{position:relative;height:0;overflow:hidden;-webkit-transition-property:height, visibility;-o-transition-property:height, visibility;transition-property:height, visibility;-webkit-transition-duration:0.35s;-o-transition-duration:0.35s;transition-duration:0.35s;-webkit-transition-timing-function:ease;-o-transition-timing-function:ease;transition-timing-function:ease}.caret{display:inline-block;width:0;height:0;margin-left:2px;vertical-align:middle;border-top:4px solid;border-right:4px solid transparent;border-left:4px solid transparent}.dropdown{position:relative}.dropdown-toggle:focus{outline:0}.dropdown-menu{position:absolute;top:100%;left:0;z-index:1000;display:none;float:left;min-width:160px;padding:5px 0;margin:2px 0 0;list-style:none;font-size:14px;text-align:left;background-color:#ffffff;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.15);border-radius:4px;-webkit-box-shadow:0 6px 12px rgba(0,0,0,0.175);box-shadow:0 6px 12px rgba(0,0,0,0.175);-webkit-background-clip:padding-box;background-clip:padding-box}.dropdown-menu.pull-right{right:0;left:auto}.dropdown-menu .divider{height:1px;margin:9px 0;overflow:hidden;background-color:#e5e5e5}.dropdown-menu>li>a{display:block;padding:3px 20px;clear:both;font-weight:normal;line-height:1.42857143;color:#333333;white-space:nowrap}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{text-decoration:none;color:#ffffff;background-color:#446e9b}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{color:#ffffff;text-decoration:none;outline:0;background-color:#446e9b}.dropdown-menu>.disabled>a,.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{color:#999999}.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{text-decoration:none;background-color:transparent;background-image:none;filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);cursor:not-allowed}.open>.dropdown-menu{display:block}.open>a{outline:0}.dropdown-menu-right{left:auto;right:0}.dropdown-menu-left{left:0;right:auto}.dropdown-header{display:block;padding:3px 20px;font-size:12px;line-height:1.42857143;color:#999999;white-space:nowrap}.dropdown-backdrop{position:fixed;left:0;right:0;bottom:0;top:0;z-index:990}.pull-right>.dropdown-menu{right:0;left:auto}.dropup .caret,.navbar-fixed-bottom .dropdown .caret{border-top:0;border-bottom:4px solid;content:""}.dropup .dropdown-menu,.navbar-fixed-bottom .dropdown .dropdown-menu{top:auto;bottom:100%;margin-bottom:1px}@media (min-width:768px){.navbar-right .dropdown-menu{left:auto;right:0}.navbar-right .dropdown-menu-left{left:0;right:auto}}.btn-group,.btn-group-vertical{position:relative;display:inline-block;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;float:left}.btn-group>.btn:hover,.btn-group-vertical>.btn:hover,.btn-group>.btn:focus,.btn-group-vertical>.btn:focus,.btn-group>.btn:active,.btn-group-vertical>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn.active{z-index:2}.btn-group .btn+.btn,.btn-group .btn+.btn-group,.btn-group .btn-group+.btn,.btn-group .btn-group+.btn-group{margin-left:-1px}.btn-toolbar{margin-left:-5px}.btn-toolbar .btn-group,.btn-toolbar .input-group{float:left}.btn-toolbar>.btn,.btn-toolbar>.btn-group,.btn-toolbar>.input-group{margin-left:5px}.btn-group>.btn:not(:first-child):not(:last-child):not(.dropdown-toggle){border-radius:0}.btn-group>.btn:first-child{margin-left:0}.btn-group>.btn:first-child:not(:last-child):not(.dropdown-toggle){border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn:last-child:not(:first-child),.btn-group>.dropdown-toggle:not(:first-child){border-bottom-left-radius:0;border-top-left-radius:0}.btn-group>.btn-group{float:left}.btn-group>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group>.btn-group:first-child>.btn:last-child,.btn-group>.btn-group:first-child>.dropdown-toggle{border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn-group:last-child>.btn:first-child{border-bottom-left-radius:0;border-top-left-radius:0}.btn-group .dropdown-toggle:active,.btn-group.open .dropdown-toggle{outline:0}.btn-group>.btn+.dropdown-toggle{padding-left:8px;padding-right:8px}.btn-group>.btn-lg+.dropdown-toggle{padding-left:12px;padding-right:12px}.btn-group.open .dropdown-toggle{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn-group.open .dropdown-toggle.btn-link{-webkit-box-shadow:none;box-shadow:none}.btn .caret{margin-left:0}.btn-lg .caret{border-width:5px 5px 0;border-bottom-width:0}.dropup .btn-lg .caret{border-width:0 5px 5px}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group,.btn-group-vertical>.btn-group>.btn{display:block;float:none;width:100%;max-width:100%}.btn-group-vertical>.btn-group>.btn{float:none}.btn-group-vertical>.btn+.btn,.btn-group-vertical>.btn+.btn-group,.btn-group-vertical>.btn-group+.btn,.btn-group-vertical>.btn-group+.btn-group{margin-top:-1px;margin-left:0}.btn-group-vertical>.btn:not(:first-child):not(:last-child){border-radius:0}.btn-group-vertical>.btn:first-child:not(:last-child){border-top-right-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn:last-child:not(:first-child){border-bottom-left-radius:4px;border-top-right-radius:0;border-top-left-radius:0}.btn-group-vertical>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group-vertical>.btn-group:first-child:not(:last-child)>.btn:last-child,.btn-group-vertical>.btn-group:first-child:not(:last-child)>.dropdown-toggle{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn-group:last-child:not(:first-child)>.btn:first-child{border-top-right-radius:0;border-top-left-radius:0}.btn-group-justified{display:table;width:100%;table-layout:fixed;border-collapse:separate}.btn-group-justified>.btn,.btn-group-justified>.btn-group{float:none;display:table-cell;width:1%}.btn-group-justified>.btn-group .btn{width:100%}.btn-group-justified>.btn-group .dropdown-menu{left:auto}[data-toggle="buttons"]>.btn input[type="radio"],[data-toggle="buttons"]>.btn-group>.btn input[type="radio"],[data-toggle="buttons"]>.btn input[type="checkbox"],[data-toggle="buttons"]>.btn-group>.btn input[type="checkbox"]{position:absolute;clip:rect(0, 0, 0, 0);pointer-events:none}.input-group{position:relative;display:table;border-collapse:separate}.input-group[class*="col-"]{float:none;padding-left:0;padding-right:0}.input-group .form-control{position:relative;z-index:2;float:left;width:100%;margin-bottom:0}.input-group-lg>.form-control,.input-group-lg>.input-group-addon,.input-group-lg>.input-group-btn>.btn{height:54px;padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}select.input-group-lg>.form-control,select.input-group-lg>.input-group-addon,select.input-group-lg>.input-group-btn>.btn{height:54px;line-height:54px}textarea.input-group-lg>.form-control,textarea.input-group-lg>.input-group-addon,textarea.input-group-lg>.input-group-btn>.btn,select[multiple].input-group-lg>.form-control,select[multiple].input-group-lg>.input-group-addon,select[multiple].input-group-lg>.input-group-btn>.btn{height:auto}.input-group-sm>.form-control,.input-group-sm>.input-group-addon,.input-group-sm>.input-group-btn>.btn{height:30px;padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}select.input-group-sm>.form-control,select.input-group-sm>.input-group-addon,select.input-group-sm>.input-group-btn>.btn{height:30px;line-height:30px}textarea.input-group-sm>.form-control,textarea.input-group-sm>.input-group-addon,textarea.input-group-sm>.input-group-btn>.btn,select[multiple].input-group-sm>.form-control,select[multiple].input-group-sm>.input-group-addon,select[multiple].input-group-sm>.input-group-btn>.btn{height:auto}.input-group-addon,.input-group-btn,.input-group .form-control{display:table-cell}.input-group-addon:not(:first-child):not(:last-child),.input-group-btn:not(:first-child):not(:last-child),.input-group .form-control:not(:first-child):not(:last-child){border-radius:0}.input-group-addon,.input-group-btn{width:1%;white-space:nowrap;vertical-align:middle}.input-group-addon{padding:8px 12px;font-size:14px;font-weight:normal;line-height:1;color:#666666;text-align:center;background-color:#eeeeee;border:1px solid #cccccc;border-radius:4px}.input-group-addon.input-sm{padding:5px 10px;font-size:12px;border-radius:3px}.input-group-addon.input-lg{padding:14px 16px;font-size:18px;border-radius:6px}.input-group-addon input[type="radio"],.input-group-addon input[type="checkbox"]{margin-top:0}.input-group .form-control:first-child,.input-group-addon:first-child,.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group>.btn,.input-group-btn:first-child>.dropdown-toggle,.input-group-btn:last-child>.btn:not(:last-child):not(.dropdown-toggle),.input-group-btn:last-child>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-top-right-radius:0}.input-group-addon:first-child{border-right:0}.input-group .form-control:last-child,.input-group-addon:last-child,.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group>.btn,.input-group-btn:last-child>.dropdown-toggle,.input-group-btn:first-child>.btn:not(:first-child),.input-group-btn:first-child>.btn-group:not(:first-child)>.btn{border-bottom-left-radius:0;border-top-left-radius:0}.input-group-addon:last-child{border-left:0}.input-group-btn{position:relative;font-size:0;white-space:nowrap}.input-group-btn>.btn{position:relative}.input-group-btn>.btn+.btn{margin-left:-1px}.input-group-btn>.btn:hover,.input-group-btn>.btn:focus,.input-group-btn>.btn:active{z-index:2}.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group{margin-right:-1px}.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group{margin-left:-1px}.nav{margin-bottom:0;padding-left:0;list-style:none}.nav>li{position:relative;display:block}.nav>li>a{position:relative;display:block;padding:10px 15px}.nav>li>a:hover,.nav>li>a:focus{text-decoration:none;background-color:#eeeeee}.nav>li.disabled>a{color:#999999}.nav>li.disabled>a:hover,.nav>li.disabled>a:focus{color:#999999;text-decoration:none;background-color:transparent;cursor:not-allowed}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{background-color:#eeeeee;border-color:#3399f3}.nav .nav-divider{height:1px;margin:9px 0;overflow:hidden;background-color:#e5e5e5}.nav>li>a>img{max-width:none}.nav-tabs{border-bottom:1px solid #dddddd}.nav-tabs>li{float:left;margin-bottom:-1px}.nav-tabs>li>a{margin-right:2px;line-height:1.42857143;border:1px solid transparent;border-radius:4px 4px 0 0}.nav-tabs>li>a:hover{border-color:#eeeeee #eeeeee #dddddd}.nav-tabs>li.active>a,.nav-tabs>li.active>a:hover,.nav-tabs>li.active>a:focus{color:#666666;background-color:#ffffff;border:1px solid #dddddd;border-bottom-color:transparent;cursor:default}.nav-tabs.nav-justified{width:100%;border-bottom:0}.nav-tabs.nav-justified>li{float:none}.nav-tabs.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-tabs.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-tabs.nav-justified>li{display:table-cell;width:1%}.nav-tabs.nav-justified>li>a{margin-bottom:0}}.nav-tabs.nav-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs.nav-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border-bottom-color:#ffffff}}.nav-pills>li{float:left}.nav-pills>li>a{border-radius:4px}.nav-pills>li+li{margin-left:2px}.nav-pills>li.active>a,.nav-pills>li.active>a:hover,.nav-pills>li.active>a:focus{color:#ffffff;background-color:#446e9b}.nav-stacked>li{float:none}.nav-stacked>li+li{margin-top:2px;margin-left:0}.nav-justified{width:100%}.nav-justified>li{float:none}.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-justified>li{display:table-cell;width:1%}.nav-justified>li>a{margin-bottom:0}}.nav-tabs-justified{border-bottom:0}.nav-tabs-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border-bottom-color:#ffffff}}.tab-content>.tab-pane{display:none;visibility:hidden}.tab-content>.active{display:block;visibility:visible}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-right-radius:0;border-top-left-radius:0}.navbar{position:relative;min-height:50px;margin-bottom:20px;border:1px solid transparent}@media (min-width:768px){.navbar{border-radius:4px}}@media (min-width:768px){.navbar-header{float:left}}.navbar-collapse{overflow-x:visible;padding-right:15px;padding-left:15px;border-top:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);-webkit-overflow-scrolling:touch}.navbar-collapse.in{overflow-y:auto}@media (min-width:768px){.navbar-collapse{width:auto;border-top:0;-webkit-box-shadow:none;box-shadow:none}.navbar-collapse.collapse{display:block !important;visibility:visible !important;height:auto !important;padding-bottom:0;overflow:visible !important}.navbar-collapse.in{overflow-y:visible}.navbar-fixed-top .navbar-collapse,.navbar-static-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{padding-left:0;padding-right:0}}.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:340px}@media (max-device-width:480px) and (orientation:landscape){.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:200px}}.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:0;margin-left:0}}.navbar-static-top{z-index:1000;border-width:0 0 1px}@media (min-width:768px){.navbar-static-top{border-radius:0}}.navbar-fixed-top,.navbar-fixed-bottom{position:fixed;right:0;left:0;z-index:1030}@media (min-width:768px){.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}}.navbar-fixed-top{top:0;border-width:0 0 1px}.navbar-fixed-bottom{bottom:0;margin-bottom:0;border-width:1px 0 0}.navbar-brand{float:left;padding:15px 15px;font-size:18px;line-height:20px;height:50px}.navbar-brand:hover,.navbar-brand:focus{text-decoration:none}.navbar-brand>img{display:block}@media (min-width:768px){.navbar>.container .navbar-brand,.navbar>.container-fluid .navbar-brand{margin-left:-15px}}.navbar-toggle{position:relative;float:right;margin-right:15px;padding:9px 10px;margin-top:8px;margin-bottom:8px;background-color:transparent;background-image:none;border:1px solid transparent;border-radius:4px}.navbar-toggle:focus{outline:0}.navbar-toggle .icon-bar{display:block;width:22px;height:2px;border-radius:1px}.navbar-toggle .icon-bar+.icon-bar{margin-top:4px}@media (min-width:768px){.navbar-toggle{display:none}}.navbar-nav{margin:7.5px -15px}.navbar-nav>li>a{padding-top:10px;padding-bottom:10px;line-height:20px}@media (max-width:767px){.navbar-nav .open .dropdown-menu{position:static;float:none;width:auto;margin-top:0;background-color:transparent;border:0;-webkit-box-shadow:none;box-shadow:none}.navbar-nav .open .dropdown-menu>li>a,.navbar-nav .open .dropdown-menu .dropdown-header{padding:5px 15px 5px 25px}.navbar-nav .open .dropdown-menu>li>a{line-height:20px}.navbar-nav .open .dropdown-menu>li>a:hover,.navbar-nav .open .dropdown-menu>li>a:focus{background-image:none}}@media (min-width:768px){.navbar-nav{float:left;margin:0}.navbar-nav>li{float:left}.navbar-nav>li>a{padding-top:15px;padding-bottom:15px}}.navbar-form{margin-left:-15px;margin-right:-15px;padding:10px 15px;border-top:1px solid transparent;border-bottom:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);margin-top:6px;margin-bottom:6px}@media (min-width:768px){.navbar-form .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.navbar-form .form-control{display:inline-block;width:auto;vertical-align:middle}.navbar-form .form-control-static{display:inline-block}.navbar-form .input-group{display:inline-table;vertical-align:middle}.navbar-form .input-group .input-group-addon,.navbar-form .input-group .input-group-btn,.navbar-form .input-group .form-control{width:auto}.navbar-form .input-group>.form-control{width:100%}.navbar-form .control-label{margin-bottom:0;vertical-align:middle}.navbar-form .radio,.navbar-form .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.navbar-form .radio label,.navbar-form .checkbox label{padding-left:0}.navbar-form .radio input[type="radio"],.navbar-form .checkbox input[type="checkbox"]{position:relative;margin-left:0}.navbar-form .has-feedback .form-control-feedback{top:0}}@media (max-width:767px){.navbar-form .form-group{margin-bottom:5px}.navbar-form .form-group:last-child{margin-bottom:0}}@media (min-width:768px){.navbar-form{width:auto;border:0;margin-left:0;margin-right:0;padding-top:0;padding-bottom:0;-webkit-box-shadow:none;box-shadow:none}}.navbar-nav>li>.dropdown-menu{margin-top:0;border-top-right-radius:0;border-top-left-radius:0}.navbar-fixed-bottom .navbar-nav>li>.dropdown-menu{border-top-right-radius:4px;border-top-left-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.navbar-btn{margin-top:6px;margin-bottom:6px}.navbar-btn.btn-sm{margin-top:10px;margin-bottom:10px}.navbar-btn.btn-xs{margin-top:14px;margin-bottom:14px}.navbar-text{margin-top:15px;margin-bottom:15px}@media (min-width:768px){.navbar-text{float:left;margin-left:15px;margin-right:15px}}@media (min-width:768px){.navbar-left{float:left !important}.navbar-right{float:right !important;margin-right:-15px}.navbar-right~.navbar-right{margin-right:0}}.navbar-default{background-color:#eeeeee;border-color:#dddddd}.navbar-default .navbar-brand{color:#777777}.navbar-default .navbar-brand:hover,.navbar-default .navbar-brand:focus{color:#3399f3;background-color:transparent}.navbar-default .navbar-text{color:#777777}.navbar-default .navbar-nav>li>a{color:#777777}.navbar-default .navbar-nav>li>a:hover,.navbar-default .navbar-nav>li>a:focus{color:#3399f3;background-color:transparent}.navbar-default .navbar-nav>.active>a,.navbar-default .navbar-nav>.active>a:hover,.navbar-default .navbar-nav>.active>a:focus{color:#3399f3;background-color:transparent}.navbar-default .navbar-nav>.disabled>a,.navbar-default .navbar-nav>.disabled>a:hover,.navbar-default .navbar-nav>.disabled>a:focus{color:#444444;background-color:transparent}.navbar-default .navbar-toggle{border-color:#dddddd}.navbar-default .navbar-toggle:hover,.navbar-default .navbar-toggle:focus{background-color:#dddddd}.navbar-default .navbar-toggle .icon-bar{background-color:#cccccc}.navbar-default .navbar-collapse,.navbar-default .navbar-form{border-color:#dddddd}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.open>a:hover,.navbar-default .navbar-nav>.open>a:focus{background-color:transparent;color:#3399f3}@media (max-width:767px){.navbar-default .navbar-nav .open .dropdown-menu>li>a{color:#777777}.navbar-default .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>li>a:focus{color:#3399f3;background-color:transparent}.navbar-default .navbar-nav .open .dropdown-menu>.active>a,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:focus{color:#3399f3;background-color:transparent}.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#444444;background-color:transparent}}.navbar-default .navbar-link{color:#777777}.navbar-default .navbar-link:hover{color:#3399f3}.navbar-default .btn-link{color:#777777}.navbar-default .btn-link:hover,.navbar-default .btn-link:focus{color:#3399f3}.navbar-default .btn-link[disabled]:hover,fieldset[disabled] .navbar-default .btn-link:hover,.navbar-default .btn-link[disabled]:focus,fieldset[disabled] .navbar-default .btn-link:focus{color:#444444}.navbar-inverse{background-color:#446e9b;border-color:#345578}.navbar-inverse .navbar-brand{color:#dddddd}.navbar-inverse .navbar-brand:hover,.navbar-inverse .navbar-brand:focus{color:#ffffff;background-color:transparent}.navbar-inverse .navbar-text{color:#dddddd}.navbar-inverse .navbar-nav>li>a{color:#dddddd}.navbar-inverse .navbar-nav>li>a:hover,.navbar-inverse .navbar-nav>li>a:focus{color:#ffffff;background-color:transparent}.navbar-inverse .navbar-nav>.active>a,.navbar-inverse .navbar-nav>.active>a:hover,.navbar-inverse .navbar-nav>.active>a:focus{color:#ffffff;background-color:transparent}.navbar-inverse .navbar-nav>.disabled>a,.navbar-inverse .navbar-nav>.disabled>a:hover,.navbar-inverse .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-inverse .navbar-toggle{border-color:#345578}.navbar-inverse .navbar-toggle:hover,.navbar-inverse .navbar-toggle:focus{background-color:#345578}.navbar-inverse .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-inverse .navbar-collapse,.navbar-inverse .navbar-form{border-color:#395c82}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.open>a:hover,.navbar-inverse .navbar-nav>.open>a:focus{background-color:transparent;color:#ffffff}@media (max-width:767px){.navbar-inverse .navbar-nav .open .dropdown-menu>.dropdown-header{border-color:#345578}.navbar-inverse .navbar-nav .open .dropdown-menu .divider{background-color:#345578}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a{color:#dddddd}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:focus{color:#ffffff;background-color:transparent}.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:transparent}.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-inverse .navbar-link{color:#dddddd}.navbar-inverse .navbar-link:hover{color:#ffffff}.navbar-inverse .btn-link{color:#dddddd}.navbar-inverse .btn-link:hover,.navbar-inverse .btn-link:focus{color:#ffffff}.navbar-inverse .btn-link[disabled]:hover,fieldset[disabled] .navbar-inverse .btn-link:hover,.navbar-inverse .btn-link[disabled]:focus,fieldset[disabled] .navbar-inverse .btn-link:focus{color:#cccccc}.breadcrumb{padding:8px 15px;margin-bottom:20px;list-style:none;background-color:#f5f5f5;border-radius:4px}.breadcrumb>li{display:inline-block}.breadcrumb>li+li:before{content:"/\00a0";padding:0 5px;color:#cccccc}.breadcrumb>.active{color:#999999}.pagination{display:inline-block;padding-left:0;margin:20px 0;border-radius:4px}.pagination>li{display:inline}.pagination>li>a,.pagination>li>span{position:relative;float:left;padding:8px 12px;line-height:1.42857143;text-decoration:none;color:#3399f3;background-color:#ffffff;border:1px solid #dddddd;margin-left:-1px}.pagination>li:first-child>a,.pagination>li:first-child>span{margin-left:0;border-bottom-left-radius:4px;border-top-left-radius:4px}.pagination>li:last-child>a,.pagination>li:last-child>span{border-bottom-right-radius:4px;border-top-right-radius:4px}.pagination>li>a:hover,.pagination>li>span:hover,.pagination>li>a:focus,.pagination>li>span:focus{color:#3399f3;background-color:#eeeeee;border-color:#dddddd}.pagination>.active>a,.pagination>.active>span,.pagination>.active>a:hover,.pagination>.active>span:hover,.pagination>.active>a:focus,.pagination>.active>span:focus{z-index:2;color:#999999;background-color:#f5f5f5;border-color:#dddddd;cursor:default}.pagination>.disabled>span,.pagination>.disabled>span:hover,.pagination>.disabled>span:focus,.pagination>.disabled>a,.pagination>.disabled>a:hover,.pagination>.disabled>a:focus{color:#999999;background-color:#ffffff;border-color:#dddddd;cursor:not-allowed}.pagination-lg>li>a,.pagination-lg>li>span{padding:14px 16px;font-size:18px}.pagination-lg>li:first-child>a,.pagination-lg>li:first-child>span{border-bottom-left-radius:6px;border-top-left-radius:6px}.pagination-lg>li:last-child>a,.pagination-lg>li:last-child>span{border-bottom-right-radius:6px;border-top-right-radius:6px}.pagination-sm>li>a,.pagination-sm>li>span{padding:5px 10px;font-size:12px}.pagination-sm>li:first-child>a,.pagination-sm>li:first-child>span{border-bottom-left-radius:3px;border-top-left-radius:3px}.pagination-sm>li:last-child>a,.pagination-sm>li:last-child>span{border-bottom-right-radius:3px;border-top-right-radius:3px}.pager{padding-left:0;margin:20px 0;list-style:none;text-align:center}.pager li{display:inline}.pager li>a,.pager li>span{display:inline-block;padding:5px 14px;background-color:#ffffff;border:1px solid #dddddd;border-radius:15px}.pager li>a:hover,.pager li>a:focus{text-decoration:none;background-color:#eeeeee}.pager .next>a,.pager .next>span{float:right}.pager .previous>a,.pager .previous>span{float:left}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{color:#999999;background-color:#ffffff;cursor:not-allowed}.label{display:inline;padding:.2em .6em .3em;font-size:75%;font-weight:bold;line-height:1;color:#ffffff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25em}a.label:hover,a.label:focus{color:#ffffff;text-decoration:none;cursor:pointer}.label:empty{display:none}.btn .label{position:relative;top:-1px}.label-default{background-color:#474949}.label-default[href]:hover,.label-default[href]:focus{background-color:#2e2f2f}.label-primary{background-color:#446e9b}.label-primary[href]:hover,.label-primary[href]:focus{background-color:#345578}.label-success{background-color:#3cb521}.label-success[href]:hover,.label-success[href]:focus{background-color:#2e8a19}.label-info{background-color:#3399f3}.label-info[href]:hover,.label-info[href]:focus{background-color:#0e80e5}.label-warning{background-color:#d47500}.label-warning[href]:hover,.label-warning[href]:focus{background-color:#a15900}.label-danger{background-color:#cd0200}.label-danger[href]:hover,.label-danger[href]:focus{background-color:#9a0200}.badge{display:inline-block;min-width:10px;padding:3px 7px;font-size:12px;font-weight:bold;color:#ffffff;line-height:1;vertical-align:baseline;white-space:nowrap;text-align:center;background-color:#3399f3;border-radius:10px}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.btn-xs .badge{top:0;padding:1px 5px}a.badge:hover,a.badge:focus{color:#ffffff;text-decoration:none;cursor:pointer}.list-group-item.active>.badge,.nav-pills>.active>a>.badge{color:#3399f3;background-color:#ffffff}.list-group-item>.badge{float:right}.list-group-item>.badge+.badge{margin-right:5px}.nav-pills>li>a>.badge{margin-left:3px}.jumbotron{padding:30px 15px;margin-bottom:30px;color:inherit;background-color:#eeeeee}.jumbotron h1,.jumbotron .h1{color:inherit}.jumbotron p{margin-bottom:15px;font-size:21px;font-weight:200}.jumbotron>hr{border-top-color:#d5d5d5}.container .jumbotron,.container-fluid .jumbotron{border-radius:6px}.jumbotron .container{max-width:100%}@media screen and (min-width:768px){.jumbotron{padding:48px 0}.container .jumbotron,.container-fluid .jumbotron{padding-left:60px;padding-right:60px}.jumbotron h1,.jumbotron .h1{font-size:63px}}.thumbnail{display:block;padding:4px;margin-bottom:20px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:border .2s ease-in-out;-o-transition:border .2s ease-in-out;transition:border .2s ease-in-out}.thumbnail>img,.thumbnail a>img{margin-left:auto;margin-right:auto}a.thumbnail:hover,a.thumbnail:focus,a.thumbnail.active{border-color:#3399f3}.thumbnail .caption{padding:9px;color:#666666}.alert{padding:15px;margin-bottom:20px;border:1px solid transparent;border-radius:4px}.alert h4{margin-top:0;color:inherit}.alert .alert-link{font-weight:bold}.alert>p,.alert>ul{margin-bottom:0}.alert>p+p{margin-top:5px}.alert-dismissable,.alert-dismissible{padding-right:35px}.alert-dismissable .close,.alert-dismissible .close{position:relative;top:-2px;right:-21px;color:inherit}.alert-success{background-color:#dff0d8;border-color:#d6e9c6;color:#468847}.alert-success hr{border-top-color:#c9e2b3}.alert-success .alert-link{color:#356635}.alert-info{background-color:#d9edf7;border-color:#bce8f1;color:#3a87ad}.alert-info hr{border-top-color:#a6e1ec}.alert-info .alert-link{color:#2d6987}.alert-warning{background-color:#fcf8e3;border-color:#fbeed5;color:#c09853}.alert-warning hr{border-top-color:#f8e5be}.alert-warning .alert-link{color:#a47e3c}.alert-danger{background-color:#f2dede;border-color:#eed3d7;color:#b94a48}.alert-danger hr{border-top-color:#e6c1c7}.alert-danger .alert-link{color:#953b39}@-webkit-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@-o-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}.progress{overflow:hidden;height:20px;margin-bottom:20px;background-color:#f5f5f5;border-radius:4px;-webkit-box-shadow:inset 0 1px 2px rgba(0,0,0,0.1);box-shadow:inset 0 1px 2px rgba(0,0,0,0.1)}.progress-bar{float:left;width:0%;height:100%;font-size:12px;line-height:20px;color:#ffffff;text-align:center;background-color:#446e9b;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);-webkit-transition:width 0.6s ease;-o-transition:width 0.6s ease;transition:width 0.6s ease}.progress-striped .progress-bar,.progress-bar-striped{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);-webkit-background-size:40px 40px;background-size:40px 40px}.progress.active .progress-bar,.progress-bar.active{-webkit-animation:progress-bar-stripes 2s linear infinite;-o-animation:progress-bar-stripes 2s linear infinite;animation:progress-bar-stripes 2s linear infinite}.progress-bar-success{background-color:#3cb521}.progress-striped .progress-bar-success{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-info{background-color:#3399f3}.progress-striped .progress-bar-info{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-warning{background-color:#d47500}.progress-striped .progress-bar-warning{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-danger{background-color:#cd0200}.progress-striped .progress-bar-danger{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.media{margin-top:15px}.media:first-child{margin-top:0}.media-right,.media>.pull-right{padding-left:10px}.media-left,.media>.pull-left{padding-right:10px}.media-left,.media-right,.media-body{display:table-cell;vertical-align:top}.media-middle{vertical-align:middle}.media-bottom{vertical-align:bottom}.media-heading{margin-top:0;margin-bottom:5px}.media-list{padding-left:0;list-style:none}.list-group{margin-bottom:20px;padding-left:0}.list-group-item{position:relative;display:block;padding:10px 15px;margin-bottom:-1px;background-color:#ffffff;border:1px solid #dddddd}.list-group-item:first-child{border-top-right-radius:4px;border-top-left-radius:4px}.list-group-item:last-child{margin-bottom:0;border-bottom-right-radius:4px;border-bottom-left-radius:4px}a.list-group-item{color:#555555}a.list-group-item .list-group-item-heading{color:#333333}a.list-group-item:hover,a.list-group-item:focus{text-decoration:none;color:#555555;background-color:#f5f5f5}.list-group-item.disabled,.list-group-item.disabled:hover,.list-group-item.disabled:focus{background-color:#eeeeee;color:#999999;cursor:not-allowed}.list-group-item.disabled .list-group-item-heading,.list-group-item.disabled:hover .list-group-item-heading,.list-group-item.disabled:focus .list-group-item-heading{color:inherit}.list-group-item.disabled .list-group-item-text,.list-group-item.disabled:hover .list-group-item-text,.list-group-item.disabled:focus .list-group-item-text{color:#999999}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{z-index:2;color:#ffffff;background-color:#446e9b;border-color:#446e9b}.list-group-item.active .list-group-item-heading,.list-group-item.active:hover .list-group-item-heading,.list-group-item.active:focus .list-group-item-heading,.list-group-item.active .list-group-item-heading>small,.list-group-item.active:hover .list-group-item-heading>small,.list-group-item.active:focus .list-group-item-heading>small,.list-group-item.active .list-group-item-heading>.small,.list-group-item.active:hover .list-group-item-heading>.small,.list-group-item.active:focus .list-group-item-heading>.small{color:inherit}.list-group-item.active .list-group-item-text,.list-group-item.active:hover .list-group-item-text,.list-group-item.active:focus .list-group-item-text{color:#c5d5e6}.list-group-item-success{color:#468847;background-color:#dff0d8}a.list-group-item-success{color:#468847}a.list-group-item-success .list-group-item-heading{color:inherit}a.list-group-item-success:hover,a.list-group-item-success:focus{color:#468847;background-color:#d0e9c6}a.list-group-item-success.active,a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{color:#fff;background-color:#468847;border-color:#468847}.list-group-item-info{color:#3a87ad;background-color:#d9edf7}a.list-group-item-info{color:#3a87ad}a.list-group-item-info .list-group-item-heading{color:inherit}a.list-group-item-info:hover,a.list-group-item-info:focus{color:#3a87ad;background-color:#c4e3f3}a.list-group-item-info.active,a.list-group-item-info.active:hover,a.list-group-item-info.active:focus{color:#fff;background-color:#3a87ad;border-color:#3a87ad}.list-group-item-warning{color:#c09853;background-color:#fcf8e3}a.list-group-item-warning{color:#c09853}a.list-group-item-warning .list-group-item-heading{color:inherit}a.list-group-item-warning:hover,a.list-group-item-warning:focus{color:#c09853;background-color:#faf2cc}a.list-group-item-warning.active,a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{color:#fff;background-color:#c09853;border-color:#c09853}.list-group-item-danger{color:#b94a48;background-color:#f2dede}a.list-group-item-danger{color:#b94a48}a.list-group-item-danger .list-group-item-heading{color:inherit}a.list-group-item-danger:hover,a.list-group-item-danger:focus{color:#b94a48;background-color:#ebcccc}a.list-group-item-danger.active,a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{color:#fff;background-color:#b94a48;border-color:#b94a48}.list-group-item-heading{margin-top:0;margin-bottom:5px}.list-group-item-text{margin-bottom:0;line-height:1.3}.panel{margin-bottom:20px;background-color:#ffffff;border:1px solid transparent;border-radius:4px;-webkit-box-shadow:0 1px 1px rgba(0,0,0,0.05);box-shadow:0 1px 1px rgba(0,0,0,0.05)}.panel-body{padding:15px}.panel-heading{padding:10px 15px;border-bottom:1px solid transparent;border-top-right-radius:3px;border-top-left-radius:3px}.panel-heading>.dropdown .dropdown-toggle{color:inherit}.panel-title{margin-top:0;margin-bottom:0;font-size:16px;color:inherit}.panel-title>a{color:inherit}.panel-footer{padding:10px 15px;background-color:#f5f5f5;border-top:1px solid #dddddd;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.list-group,.panel>.panel-collapse>.list-group{margin-bottom:0}.panel>.list-group .list-group-item,.panel>.panel-collapse>.list-group .list-group-item{border-width:1px 0;border-radius:0}.panel>.list-group:first-child .list-group-item:first-child,.panel>.panel-collapse>.list-group:first-child .list-group-item:first-child{border-top:0;border-top-right-radius:3px;border-top-left-radius:3px}.panel>.list-group:last-child .list-group-item:last-child,.panel>.panel-collapse>.list-group:last-child .list-group-item:last-child{border-bottom:0;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel-heading+.list-group .list-group-item:first-child{border-top-width:0}.list-group+.panel-footer{border-top-width:0}.panel>.table,.panel>.table-responsive>.table,.panel>.panel-collapse>.table{margin-bottom:0}.panel>.table caption,.panel>.table-responsive>.table caption,.panel>.panel-collapse>.table caption{padding-left:15px;padding-right:15px}.panel>.table:first-child,.panel>.table-responsive:first-child>.table:first-child{border-top-right-radius:3px;border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child{border-top-left-radius:3px;border-top-right-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:first-child{border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:last-child{border-top-right-radius:3px}.panel>.table:last-child,.panel>.table-responsive:last-child>.table:last-child{border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child{border-bottom-left-radius:3px;border-bottom-right-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:first-child{border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:last-child{border-bottom-right-radius:3px}.panel>.panel-body+.table,.panel>.panel-body+.table-responsive,.panel>.table+.panel-body,.panel>.table-responsive+.panel-body{border-top:1px solid #dddddd}.panel>.table>tbody:first-child>tr:first-child th,.panel>.table>tbody:first-child>tr:first-child td{border-top:0}.panel>.table-bordered,.panel>.table-responsive>.table-bordered{border:0}.panel>.table-bordered>thead>tr>th:first-child,.panel>.table-responsive>.table-bordered>thead>tr>th:first-child,.panel>.table-bordered>tbody>tr>th:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:first-child,.panel>.table-bordered>tfoot>tr>th:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:first-child,.panel>.table-bordered>thead>tr>td:first-child,.panel>.table-responsive>.table-bordered>thead>tr>td:first-child,.panel>.table-bordered>tbody>tr>td:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:first-child,.panel>.table-bordered>tfoot>tr>td:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.panel>.table-bordered>thead>tr>th:last-child,.panel>.table-responsive>.table-bordered>thead>tr>th:last-child,.panel>.table-bordered>tbody>tr>th:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:last-child,.panel>.table-bordered>tfoot>tr>th:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:last-child,.panel>.table-bordered>thead>tr>td:last-child,.panel>.table-responsive>.table-bordered>thead>tr>td:last-child,.panel>.table-bordered>tbody>tr>td:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:last-child,.panel>.table-bordered>tfoot>tr>td:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.panel>.table-bordered>thead>tr:first-child>td,.panel>.table-responsive>.table-bordered>thead>tr:first-child>td,.panel>.table-bordered>tbody>tr:first-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>td,.panel>.table-bordered>thead>tr:first-child>th,.panel>.table-responsive>.table-bordered>thead>tr:first-child>th,.panel>.table-bordered>tbody>tr:first-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>th{border-bottom:0}.panel>.table-bordered>tbody>tr:last-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>td,.panel>.table-bordered>tfoot>tr:last-child>td,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>td,.panel>.table-bordered>tbody>tr:last-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>th,.panel>.table-bordered>tfoot>tr:last-child>th,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>th{border-bottom:0}.panel>.table-responsive{border:0;margin-bottom:0}.panel-group{margin-bottom:20px}.panel-group .panel{margin-bottom:0;border-radius:4px}.panel-group .panel+.panel{margin-top:5px}.panel-group .panel-heading{border-bottom:0}.panel-group .panel-heading+.panel-collapse>.panel-body,.panel-group .panel-heading+.panel-collapse>.list-group{border-top:1px solid #dddddd}.panel-group .panel-footer{border-top:0}.panel-group .panel-footer+.panel-collapse .panel-body{border-bottom:1px solid #dddddd}.panel-default{border-color:#dddddd}.panel-default>.panel-heading{color:#333333;background-color:#f5f5f5;border-color:#dddddd}.panel-default>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-default>.panel-heading .badge{color:#f5f5f5;background-color:#333333}.panel-default>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-primary{border-color:#446e9b}.panel-primary>.panel-heading{color:#ffffff;background-color:#446e9b;border-color:#446e9b}.panel-primary>.panel-heading+.panel-collapse>.panel-body{border-top-color:#446e9b}.panel-primary>.panel-heading .badge{color:#446e9b;background-color:#ffffff}.panel-primary>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#446e9b}.panel-success{border-color:#d6e9c6}.panel-success>.panel-heading{color:#468847;background-color:#dff0d8;border-color:#d6e9c6}.panel-success>.panel-heading+.panel-collapse>.panel-body{border-top-color:#d6e9c6}.panel-success>.panel-heading .badge{color:#dff0d8;background-color:#468847}.panel-success>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#d6e9c6}.panel-info{border-color:#bce8f1}.panel-info>.panel-heading{color:#3a87ad;background-color:#d9edf7;border-color:#bce8f1}.panel-info>.panel-heading+.panel-collapse>.panel-body{border-top-color:#bce8f1}.panel-info>.panel-heading .badge{color:#d9edf7;background-color:#3a87ad}.panel-info>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#bce8f1}.panel-warning{border-color:#fbeed5}.panel-warning>.panel-heading{color:#c09853;background-color:#fcf8e3;border-color:#fbeed5}.panel-warning>.panel-heading+.panel-collapse>.panel-body{border-top-color:#fbeed5}.panel-warning>.panel-heading .badge{color:#fcf8e3;background-color:#c09853}.panel-warning>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#fbeed5}.panel-danger{border-color:#eed3d7}.panel-danger>.panel-heading{color:#b94a48;background-color:#f2dede;border-color:#eed3d7}.panel-danger>.panel-heading+.panel-collapse>.panel-body{border-top-color:#eed3d7}.panel-danger>.panel-heading .badge{color:#f2dede;background-color:#b94a48}.panel-danger>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#eed3d7}.embed-responsive{position:relative;display:block;height:0;padding:0;overflow:hidden}.embed-responsive .embed-responsive-item,.embed-responsive iframe,.embed-responsive embed,.embed-responsive object,.embed-responsive video{position:absolute;top:0;left:0;bottom:0;height:100%;width:100%;border:0}.embed-responsive.embed-responsive-16by9{padding-bottom:56.25%}.embed-responsive.embed-responsive-4by3{padding-bottom:75%}.well{min-height:20px;padding:19px;margin-bottom:20px;background-color:#f5f5f5;border:1px solid #e3e3e3;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.05);box-shadow:inset 0 1px 1px rgba(0,0,0,0.05)}.well blockquote{border-color:#ddd;border-color:rgba(0,0,0,0.15)}.well-lg{padding:24px;border-radius:6px}.well-sm{padding:9px;border-radius:3px}.close{float:right;font-size:21px;font-weight:bold;line-height:1;color:#000000;text-shadow:0 1px 0 #ffffff;opacity:0.2;filter:alpha(opacity=20)}.close:hover,.close:focus{color:#000000;text-decoration:none;cursor:pointer;opacity:0.5;filter:alpha(opacity=50)}button.close{padding:0;cursor:pointer;background:transparent;border:0;-webkit-appearance:none}.modal-open{overflow:hidden}.modal{display:none;overflow:hidden;position:fixed;top:0;right:0;bottom:0;left:0;z-index:1040;-webkit-overflow-scrolling:touch;outline:0}.modal.fade .modal-dialog{-webkit-transform:translate(0, -25%);-ms-transform:translate(0, -25%);-o-transform:translate(0, -25%);transform:translate(0, -25%);-webkit-transition:-webkit-transform .3s ease-out;-o-transition:-o-transform .3s ease-out;transition:transform .3s ease-out}.modal.in .modal-dialog{-webkit-transform:translate(0, 0);-ms-transform:translate(0, 0);-o-transform:translate(0, 0);transform:translate(0, 0)}.modal-open .modal{overflow-x:hidden;overflow-y:auto}.modal-dialog{position:relative;width:auto;margin:10px}.modal-content{position:relative;background-color:#ffffff;border:1px solid #999999;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 3px 9px rgba(0,0,0,0.5);box-shadow:0 3px 9px rgba(0,0,0,0.5);-webkit-background-clip:padding-box;background-clip:padding-box;outline:0}.modal-backdrop{position:absolute;top:0;right:0;left:0;background-color:#000000}.modal-backdrop.fade{opacity:0;filter:alpha(opacity=0)}.modal-backdrop.in{opacity:0.5;filter:alpha(opacity=50)}.modal-header{padding:15px;border-bottom:1px solid #e5e5e5;min-height:16.42857143px}.modal-header .close{margin-top:-2px}.modal-title{margin:0;line-height:1.42857143}.modal-body{position:relative;padding:20px}.modal-footer{padding:20px;text-align:right;border-top:1px solid #e5e5e5}.modal-footer .btn+.btn{margin-left:5px;margin-bottom:0}.modal-footer .btn-group .btn+.btn{margin-left:-1px}.modal-footer .btn-block+.btn-block{margin-left:0}.modal-scrollbar-measure{position:absolute;top:-9999px;width:50px;height:50px;overflow:scroll}@media (min-width:768px){.modal-dialog{width:600px;margin:30px auto}.modal-content{-webkit-box-shadow:0 5px 15px rgba(0,0,0,0.5);box-shadow:0 5px 15px rgba(0,0,0,0.5)}.modal-sm{width:300px}}@media (min-width:992px){.modal-lg{width:900px}}.tooltip{position:absolute;z-index:1070;display:block;visibility:visible;font-family:"Open Sans","Helvetica Neue",Helvetica,Arial,sans-serif;font-size:12px;font-weight:normal;line-height:1.4;opacity:0;filter:alpha(opacity=0)}.tooltip.in{opacity:0.9;filter:alpha(opacity=90)}.tooltip.top{margin-top:-3px;padding:5px 0}.tooltip.right{margin-left:3px;padding:0 5px}.tooltip.bottom{margin-top:3px;padding:5px 0}.tooltip.left{margin-left:-3px;padding:0 5px}.tooltip-inner{max-width:200px;padding:3px 8px;color:#ffffff;text-align:center;text-decoration:none;background-color:rgba(0,0,0,0.9);border-radius:4px}.tooltip-arrow{position:absolute;width:0;height:0;border-color:transparent;border-style:solid}.tooltip.top .tooltip-arrow{bottom:0;left:50%;margin-left:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-left .tooltip-arrow{bottom:0;right:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-right .tooltip-arrow{bottom:0;left:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.right .tooltip-arrow{top:50%;left:0;margin-top:-5px;border-width:5px 5px 5px 0;border-right-color:rgba(0,0,0,0.9)}.tooltip.left .tooltip-arrow{top:50%;right:0;margin-top:-5px;border-width:5px 0 5px 5px;border-left-color:rgba(0,0,0,0.9)}.tooltip.bottom .tooltip-arrow{top:0;left:50%;margin-left:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-left .tooltip-arrow{top:0;right:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-right .tooltip-arrow{top:0;left:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.popover{position:absolute;top:0;left:0;z-index:1060;display:none;max-width:276px;padding:1px;font-family:"Open Sans","Helvetica Neue",Helvetica,Arial,sans-serif;font-size:14px;font-weight:normal;line-height:1.42857143;text-align:left;background-color:#ffffff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 5px 10px rgba(0,0,0,0.2);box-shadow:0 5px 10px rgba(0,0,0,0.2);white-space:normal}.popover.top{margin-top:-10px}.popover.right{margin-left:10px}.popover.bottom{margin-top:10px}.popover.left{margin-left:-10px}.popover-title{margin:0;padding:8px 14px;font-size:14px;background-color:#f7f7f7;border-bottom:1px solid #ebebeb;border-radius:5px 5px 0 0}.popover-content{padding:9px 14px}.popover>.arrow,.popover>.arrow:after{position:absolute;display:block;width:0;height:0;border-color:transparent;border-style:solid}.popover>.arrow{border-width:11px}.popover>.arrow:after{border-width:10px;content:""}.popover.top>.arrow{left:50%;margin-left:-11px;border-bottom-width:0;border-top-color:#999999;border-top-color:rgba(0,0,0,0.25);bottom:-11px}.popover.top>.arrow:after{content:" ";bottom:1px;margin-left:-10px;border-bottom-width:0;border-top-color:#ffffff}.popover.right>.arrow{top:50%;left:-11px;margin-top:-11px;border-left-width:0;border-right-color:#999999;border-right-color:rgba(0,0,0,0.25)}.popover.right>.arrow:after{content:" ";left:1px;bottom:-10px;border-left-width:0;border-right-color:#ffffff}.popover.bottom>.arrow{left:50%;margin-left:-11px;border-top-width:0;border-bottom-color:#999999;border-bottom-color:rgba(0,0,0,0.25);top:-11px}.popover.bottom>.arrow:after{content:" ";top:1px;margin-left:-10px;border-top-width:0;border-bottom-color:#ffffff}.popover.left>.arrow{top:50%;right:-11px;margin-top:-11px;border-right-width:0;border-left-color:#999999;border-left-color:rgba(0,0,0,0.25)}.popover.left>.arrow:after{content:" ";right:1px;border-right-width:0;border-left-color:#ffffff;bottom:-10px}.carousel{position:relative}.carousel-inner{position:relative;overflow:hidden;width:100%}.carousel-inner>.item{display:none;position:relative;-webkit-transition:.6s ease-in-out left;-o-transition:.6s ease-in-out left;transition:.6s ease-in-out left}.carousel-inner>.item>img,.carousel-inner>.item>a>img{line-height:1}@media all and (transform-3d),(-webkit-transform-3d){.carousel-inner>.item{-webkit-transition:-webkit-transform .6s ease-in-out;-o-transition:-o-transform .6s ease-in-out;transition:transform .6s ease-in-out;-webkit-backface-visibility:hidden;backface-visibility:hidden;-webkit-perspective:1000;perspective:1000}.carousel-inner>.item.next,.carousel-inner>.item.active.right{-webkit-transform:translate3d(100%, 0, 0);transform:translate3d(100%, 0, 0);left:0}.carousel-inner>.item.prev,.carousel-inner>.item.active.left{-webkit-transform:translate3d(-100%, 0, 0);transform:translate3d(-100%, 0, 0);left:0}.carousel-inner>.item.next.left,.carousel-inner>.item.prev.right,.carousel-inner>.item.active{-webkit-transform:translate3d(0, 0, 0);transform:translate3d(0, 0, 0);left:0}}.carousel-inner>.active,.carousel-inner>.next,.carousel-inner>.prev{display:block}.carousel-inner>.active{left:0}.carousel-inner>.next,.carousel-inner>.prev{position:absolute;top:0;width:100%}.carousel-inner>.next{left:100%}.carousel-inner>.prev{left:-100%}.carousel-inner>.next.left,.carousel-inner>.prev.right{left:0}.carousel-inner>.active.left{left:-100%}.carousel-inner>.active.right{left:100%}.carousel-control{position:absolute;top:0;left:0;bottom:0;width:15%;opacity:0.5;filter:alpha(opacity=50);font-size:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-control.left{background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.5)), to(rgba(0,0,0,0.0001)));background-image:linear-gradient(to right, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1)}.carousel-control.right{left:auto;right:0;background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.0001)), to(rgba(0,0,0,0.5)));background-image:linear-gradient(to right, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1)}.carousel-control:hover,.carousel-control:focus{outline:0;color:#ffffff;text-decoration:none;opacity:0.9;filter:alpha(opacity=90)}.carousel-control .icon-prev,.carousel-control .icon-next,.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right{position:absolute;top:50%;z-index:5;display:inline-block}.carousel-control .icon-prev,.carousel-control .glyphicon-chevron-left{left:50%;margin-left:-10px}.carousel-control .icon-next,.carousel-control .glyphicon-chevron-right{right:50%;margin-right:-10px}.carousel-control .icon-prev,.carousel-control .icon-next{width:20px;height:20px;margin-top:-10px;font-family:serif}.carousel-control .icon-prev:before{content:'\2039'}.carousel-control .icon-next:before{content:'\203a'}.carousel-indicators{position:absolute;bottom:10px;left:50%;z-index:15;width:60%;margin-left:-30%;padding-left:0;list-style:none;text-align:center}.carousel-indicators li{display:inline-block;width:10px;height:10px;margin:1px;text-indent:-999px;border:1px solid #ffffff;border-radius:10px;cursor:pointer;background-color:#000 \9;background-color:rgba(0,0,0,0)}.carousel-indicators .active{margin:0;width:12px;height:12px;background-color:#ffffff}.carousel-caption{position:absolute;left:15%;right:15%;bottom:20px;z-index:10;padding-top:20px;padding-bottom:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-caption .btn{text-shadow:none}@media screen and (min-width:768px){.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right,.carousel-control .icon-prev,.carousel-control .icon-next{width:30px;height:30px;margin-top:-15px;font-size:30px}.carousel-control .glyphicon-chevron-left,.carousel-control .icon-prev{margin-left:-15px}.carousel-control .glyphicon-chevron-right,.carousel-control .icon-next{margin-right:-15px}.carousel-caption{left:20%;right:20%;padding-bottom:30px}.carousel-indicators{bottom:20px}}.clearfix:before,.clearfix:after,.dl-horizontal dd:before,.dl-horizontal dd:after,.container:before,.container:after,.container-fluid:before,.container-fluid:after,.row:before,.row:after,.form-horizontal .form-group:before,.form-horizontal .form-group:after,.btn-toolbar:before,.btn-toolbar:after,.btn-group-vertical>.btn-group:before,.btn-group-vertical>.btn-group:after,.nav:before,.nav:after,.navbar:before,.navbar:after,.navbar-header:before,.navbar-header:after,.navbar-collapse:before,.navbar-collapse:after,.pager:before,.pager:after,.panel-body:before,.panel-body:after,.modal-footer:before,.modal-footer:after{content:" ";display:table}.clearfix:after,.dl-horizontal dd:after,.container:after,.container-fluid:after,.row:after,.form-horizontal .form-group:after,.btn-toolbar:after,.btn-group-vertical>.btn-group:after,.nav:after,.navbar:after,.navbar-header:after,.navbar-collapse:after,.pager:after,.panel-body:after,.modal-footer:after{clear:both}.center-block{display:block;margin-left:auto;margin-right:auto}.pull-right{float:right !important}.pull-left{float:left !important}.hide{display:none !important}.show{display:block !important}.invisible{visibility:hidden}.text-hide{font:0/0 a;color:transparent;text-shadow:none;background-color:transparent;border:0}.hidden{display:none !important;visibility:hidden !important}.affix{position:fixed}@-ms-viewport{width:device-width}.visible-xs,.visible-sm,.visible-md,.visible-lg{display:none !important}.visible-xs-block,.visible-xs-inline,.visible-xs-inline-block,.visible-sm-block,.visible-sm-inline,.visible-sm-inline-block,.visible-md-block,.visible-md-inline,.visible-md-inline-block,.visible-lg-block,.visible-lg-inline,.visible-lg-inline-block{display:none !important}@media (max-width:767px){.visible-xs{display:block !important}table.visible-xs{display:table}tr.visible-xs{display:table-row !important}th.visible-xs,td.visible-xs{display:table-cell !important}}@media (max-width:767px){.visible-xs-block{display:block !important}}@media (max-width:767px){.visible-xs-inline{display:inline !important}}@media (max-width:767px){.visible-xs-inline-block{display:inline-block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm{display:block !important}table.visible-sm{display:table}tr.visible-sm{display:table-row !important}th.visible-sm,td.visible-sm{display:table-cell !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-block{display:block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline{display:inline !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline-block{display:inline-block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md{display:block !important}table.visible-md{display:table}tr.visible-md{display:table-row !important}th.visible-md,td.visible-md{display:table-cell !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-block{display:block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline{display:inline !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline-block{display:inline-block !important}}@media (min-width:1200px){.visible-lg{display:block !important}table.visible-lg{display:table}tr.visible-lg{display:table-row !important}th.visible-lg,td.visible-lg{display:table-cell !important}}@media (min-width:1200px){.visible-lg-block{display:block !important}}@media (min-width:1200px){.visible-lg-inline{display:inline !important}}@media (min-width:1200px){.visible-lg-inline-block{display:inline-block !important}}@media (max-width:767px){.hidden-xs{display:none !important}}@media (min-width:768px) and (max-width:991px){.hidden-sm{display:none !important}}@media (min-width:992px) and (max-width:1199px){.hidden-md{display:none !important}}@media (min-width:1200px){.hidden-lg{display:none !important}}.visible-print{display:none !important}@media print{.visible-print{display:block !important}table.visible-print{display:table}tr.visible-print{display:table-row !important}th.visible-print,td.visible-print{display:table-cell !important}}.visible-print-block{display:none !important}@media print{.visible-print-block{display:block !important}}.visible-print-inline{display:none !important}@media print{.visible-print-inline{display:inline !important}}.visible-print-inline-block{display:none !important}@media print{.visible-print-inline-block{display:inline-block !important}}@media print{.hidden-print{display:none !important}}.navbar{background-image:-webkit-linear-gradient(#fff, #eee 50%, #e4e4e4);background-image:-o-linear-gradient(#fff, #eee 50%, #e4e4e4);background-image:-webkit-gradient(linear, left top, left bottom, from(#fff), color-stop(50%, #eee), to(#e4e4e4));background-image:linear-gradient(#fff, #eee 50%, #e4e4e4);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffffffff', endColorstr='#ffe4e4e4', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #d5d5d5;text-shadow:0 1px 0 rgba(255,255,255,0.3)}.navbar-inverse{background-image:-webkit-linear-gradient(#6d94bf, #446e9b 50%, #3e648d);background-image:-o-linear-gradient(#6d94bf, #446e9b 50%, #3e648d);background-image:-webkit-gradient(linear, left top, left bottom, from(#6d94bf), color-stop(50%, #446e9b), to(#3e648d));background-image:linear-gradient(#6d94bf, #446e9b 50%, #3e648d);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff6d94bf', endColorstr='#ff3e648d', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #345578;text-shadow:0 -1px 0 rgba(0,0,0,0.3)}.navbar-inverse .badge{background-color:#fff;color:#446e9b}.navbar .badge{text-shadow:none}.navbar-nav>li>a,.navbar-nav>li>a:hover{padding-top:17px;padding-bottom:13px;-webkit-transition:color ease-in-out .2s;-o-transition:color ease-in-out .2s;transition:color ease-in-out .2s}.navbar-brand,.navbar-brand:hover{-webkit-transition:color ease-in-out .2s;-o-transition:color ease-in-out .2s;transition:color ease-in-out .2s}.navbar .caret,.navbar .caret:hover{-webkit-transition:border-color ease-in-out .2s;-o-transition:border-color ease-in-out .2s;transition:border-color ease-in-out .2s}.navbar .dropdown-menu{text-shadow:none}.btn{text-shadow:0 -1px 0 rgba(0,0,0,0.3)}.btn-default{background-image:-webkit-linear-gradient(#6d7070, #474949 50%, #3d3f3f);background-image:-o-linear-gradient(#6d7070, #474949 50%, #3d3f3f);background-image:-webkit-gradient(linear, left top, left bottom, from(#6d7070), color-stop(50%, #474949), to(#3d3f3f));background-image:linear-gradient(#6d7070, #474949 50%, #3d3f3f);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff6d7070', endColorstr='#ff3d3f3f', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #2e2f2f}.btn-default:hover{background-image:-webkit-linear-gradient(#636565, #3d3f3f 50%, #333434);background-image:-o-linear-gradient(#636565, #3d3f3f 50%, #333434);background-image:-webkit-gradient(linear, left top, left bottom, from(#636565), color-stop(50%, #3d3f3f), to(#333434));background-image:linear-gradient(#636565, #3d3f3f 50%, #333434);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff636565', endColorstr='#ff333434', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #242525}.btn-primary{background-image:-webkit-linear-gradient(#6d94bf, #446e9b 50%, #3e648d);background-image:-o-linear-gradient(#6d94bf, #446e9b 50%, #3e648d);background-image:-webkit-gradient(linear, left top, left bottom, from(#6d94bf), color-stop(50%, #446e9b), to(#3e648d));background-image:linear-gradient(#6d94bf, #446e9b 50%, #3e648d);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff6d94bf', endColorstr='#ff3e648d', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #345578}.btn-primary:hover{background-image:-webkit-linear-gradient(#5f8ab9, #3e648d 50%, #385a7f);background-image:-o-linear-gradient(#5f8ab9, #3e648d 50%, #385a7f);background-image:-webkit-gradient(linear, left top, left bottom, from(#5f8ab9), color-stop(50%, #3e648d), to(#385a7f));background-image:linear-gradient(#5f8ab9, #3e648d 50%, #385a7f);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff5f8ab9', endColorstr='#ff385a7f', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #2e4b69}.btn-success{background-image:-webkit-linear-gradient(#61dd45, #3cb521 50%, #36a41e);background-image:-o-linear-gradient(#61dd45, #3cb521 50%, #36a41e);background-image:-webkit-gradient(linear, left top, left bottom, from(#61dd45), color-stop(50%, #3cb521), to(#36a41e));background-image:linear-gradient(#61dd45, #3cb521 50%, #36a41e);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff61dd45', endColorstr='#ff36a41e', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #2e8a19}.btn-success:hover{background-image:-webkit-linear-gradient(#52da34, #36a41e 50%, #31921b);background-image:-o-linear-gradient(#52da34, #36a41e 50%, #31921b);background-image:-webkit-gradient(linear, left top, left bottom, from(#52da34), color-stop(50%, #36a41e), to(#31921b));background-image:linear-gradient(#52da34, #36a41e 50%, #31921b);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff52da34', endColorstr='#ff31921b', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #287916}.btn-info{background-image:-webkit-linear-gradient(#7bbdf7, #3399f3 50%, #208ff2);background-image:-o-linear-gradient(#7bbdf7, #3399f3 50%, #208ff2);background-image:-webkit-gradient(linear, left top, left bottom, from(#7bbdf7), color-stop(50%, #3399f3), to(#208ff2));background-image:linear-gradient(#7bbdf7, #3399f3 50%, #208ff2);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff7bbdf7', endColorstr='#ff208ff2', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #0e80e5}.btn-info:hover{background-image:-webkit-linear-gradient(#68b3f6, #208ff2 50%, #0e86ef);background-image:-o-linear-gradient(#68b3f6, #208ff2 50%, #0e86ef);background-image:-webkit-gradient(linear, left top, left bottom, from(#68b3f6), color-stop(50%, #208ff2), to(#0e86ef));background-image:linear-gradient(#68b3f6, #208ff2 50%, #0e86ef);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ff68b3f6', endColorstr='#ff0e86ef', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #0c75d2}.btn-warning{background-image:-webkit-linear-gradient(#ff9c21, #d47500 50%, #c06a00);background-image:-o-linear-gradient(#ff9c21, #d47500 50%, #c06a00);background-image:-webkit-gradient(linear, left top, left bottom, from(#ff9c21), color-stop(50%, #d47500), to(#c06a00));background-image:linear-gradient(#ff9c21, #d47500 50%, #c06a00);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffff9c21', endColorstr='#ffc06a00', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #a15900}.btn-warning:hover{background-image:-webkit-linear-gradient(#ff930d, #c06a00 50%, #ab5e00);background-image:-o-linear-gradient(#ff930d, #c06a00 50%, #ab5e00);background-image:-webkit-gradient(linear, left top, left bottom, from(#ff930d), color-stop(50%, #c06a00), to(#ab5e00));background-image:linear-gradient(#ff930d, #c06a00 50%, #ab5e00);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffff930d', endColorstr='#ffab5e00', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #8d4e00}.btn-danger{background-image:-webkit-linear-gradient(#ff1d1b, #cd0200 50%, #b90200);background-image:-o-linear-gradient(#ff1d1b, #cd0200 50%, #b90200);background-image:-webkit-gradient(linear, left top, left bottom, from(#ff1d1b), color-stop(50%, #cd0200), to(#b90200));background-image:linear-gradient(#ff1d1b, #cd0200 50%, #b90200);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffff1d1b', endColorstr='#ffb90200', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #9a0200}.btn-danger:hover{background-image:-webkit-linear-gradient(#ff0906, #b90200 50%, #a40200);background-image:-o-linear-gradient(#ff0906, #b90200 50%, #a40200);background-image:-webkit-gradient(linear, left top, left bottom, from(#ff0906), color-stop(50%, #b90200), to(#a40200));background-image:linear-gradient(#ff0906, #b90200 50%, #a40200);background-repeat:no-repeat;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#ffff0906', endColorstr='#ffa40200', GradientType=0);-webkit-filter:none;filter:none;border:1px solid #860100}.btn:active,.btn.active{background-image:none;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.panel-primary .panel-title{color:#fff} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/css/united.min.css b/www/bootstrap-3.3.1/css/united.min.css deleted file mode 100644 index 78a6959..0000000 --- a/www/bootstrap-3.3.1/css/united.min.css +++ /dev/null @@ -1,14 +0,0 @@ -@font-face { - font-family: 'Ubuntu'; - font-style: normal; - font-weight: 400; - src: url(fonts/Ubuntu.ttf) format('truetype'); -} - -/*! - * bootswatch v3.3.1+1 - * Homepage: http://bootswatch.com - * Copyright 2012-2014 Thomas Park - * Licensed under MIT - * Based on Bootstrap -*//*! normalize.css v3.0.2 | MIT License | git.io/normalize */html{font-family:sans-serif;-ms-text-size-adjust:100%;-webkit-text-size-adjust:100%}body{margin:0}article,aside,details,figcaption,figure,footer,header,hgroup,main,menu,nav,section,summary{display:block}audio,canvas,progress,video{display:inline-block;vertical-align:baseline}audio:not([controls]){display:none;height:0}[hidden],template{display:none}a{background-color:transparent}a:active,a:hover{outline:0}abbr[title]{border-bottom:1px dotted}b,strong{font-weight:bold}dfn{font-style:italic}h1{font-size:2em;margin:0.67em 0}mark{background:#ff0;color:#000}small{font-size:80%}sub,sup{font-size:75%;line-height:0;position:relative;vertical-align:baseline}sup{top:-0.5em}sub{bottom:-0.25em}img{border:0}svg:not(:root){overflow:hidden}figure{margin:1em 40px}hr{-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box;height:0}pre{overflow:auto}code,kbd,pre,samp{font-family:monospace, monospace;font-size:1em}button,input,optgroup,select,textarea{color:inherit;font:inherit;margin:0}button{overflow:visible}button,select{text-transform:none}button,html input[type="button"],input[type="reset"],input[type="submit"]{-webkit-appearance:button;cursor:pointer}button[disabled],html input[disabled]{cursor:default}button::-moz-focus-inner,input::-moz-focus-inner{border:0;padding:0}input{line-height:normal}input[type="checkbox"],input[type="radio"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box;padding:0}input[type="number"]::-webkit-inner-spin-button,input[type="number"]::-webkit-outer-spin-button{height:auto}input[type="search"]{-webkit-appearance:textfield;-moz-box-sizing:content-box;-webkit-box-sizing:content-box;box-sizing:content-box}input[type="search"]::-webkit-search-cancel-button,input[type="search"]::-webkit-search-decoration{-webkit-appearance:none}fieldset{border:1px solid #c0c0c0;margin:0 2px;padding:0.35em 0.625em 0.75em}legend{border:0;padding:0}textarea{overflow:auto}optgroup{font-weight:bold}table{border-collapse:collapse;border-spacing:0}td,th{padding:0}/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */@media print{*,*:before,*:after{background:transparent !important;color:#000 !important;-webkit-box-shadow:none !important;box-shadow:none !important;text-shadow:none !important}a,a:visited{text-decoration:underline}a[href]:after{content:" (" attr(href) ")"}abbr[title]:after{content:" (" attr(title) ")"}a[href^="#"]:after,a[href^="javascript:"]:after{content:""}pre,blockquote{border:1px solid #999;page-break-inside:avoid}thead{display:table-header-group}tr,img{page-break-inside:avoid}img{max-width:100% !important}p,h2,h3{orphans:3;widows:3}h2,h3{page-break-after:avoid}select{background:#fff !important}.navbar{display:none}.btn>.caret,.dropup>.btn>.caret{border-top-color:#000 !important}.label{border:1px solid #000}.table{border-collapse:collapse !important}.table td,.table th{background-color:#fff !important}.table-bordered th,.table-bordered td{border:1px solid #ddd !important}}@font-face{font-family:'Glyphicons Halflings';src:url('../fonts/glyphicons-halflings-regular.eot');src:url('../fonts/glyphicons-halflings-regular.eot?#iefix') format('embedded-opentype'),url('../fonts/glyphicons-halflings-regular.woff') format('woff'),url('../fonts/glyphicons-halflings-regular.ttf') format('truetype'),url('../fonts/glyphicons-halflings-regular.svg#glyphicons_halflingsregular') format('svg')}.glyphicon{position:relative;top:1px;display:inline-block;font-family:'Glyphicons Halflings';font-style:normal;font-weight:normal;line-height:1;-webkit-font-smoothing:antialiased;-moz-osx-font-smoothing:grayscale}.glyphicon-asterisk:before{content:"\2a"}.glyphicon-plus:before{content:"\2b"}.glyphicon-euro:before,.glyphicon-eur:before{content:"\20ac"}.glyphicon-minus:before{content:"\2212"}.glyphicon-cloud:before{content:"\2601"}.glyphicon-envelope:before{content:"\2709"}.glyphicon-pencil:before{content:"\270f"}.glyphicon-glass:before{content:"\e001"}.glyphicon-music:before{content:"\e002"}.glyphicon-search:before{content:"\e003"}.glyphicon-heart:before{content:"\e005"}.glyphicon-star:before{content:"\e006"}.glyphicon-star-empty:before{content:"\e007"}.glyphicon-user:before{content:"\e008"}.glyphicon-film:before{content:"\e009"}.glyphicon-th-large:before{content:"\e010"}.glyphicon-th:before{content:"\e011"}.glyphicon-th-list:before{content:"\e012"}.glyphicon-ok:before{content:"\e013"}.glyphicon-remove:before{content:"\e014"}.glyphicon-zoom-in:before{content:"\e015"}.glyphicon-zoom-out:before{content:"\e016"}.glyphicon-off:before{content:"\e017"}.glyphicon-signal:before{content:"\e018"}.glyphicon-cog:before{content:"\e019"}.glyphicon-trash:before{content:"\e020"}.glyphicon-home:before{content:"\e021"}.glyphicon-file:before{content:"\e022"}.glyphicon-time:before{content:"\e023"}.glyphicon-road:before{content:"\e024"}.glyphicon-download-alt:before{content:"\e025"}.glyphicon-download:before{content:"\e026"}.glyphicon-upload:before{content:"\e027"}.glyphicon-inbox:before{content:"\e028"}.glyphicon-play-circle:before{content:"\e029"}.glyphicon-repeat:before{content:"\e030"}.glyphicon-refresh:before{content:"\e031"}.glyphicon-list-alt:before{content:"\e032"}.glyphicon-lock:before{content:"\e033"}.glyphicon-flag:before{content:"\e034"}.glyphicon-headphones:before{content:"\e035"}.glyphicon-volume-off:before{content:"\e036"}.glyphicon-volume-down:before{content:"\e037"}.glyphicon-volume-up:before{content:"\e038"}.glyphicon-qrcode:before{content:"\e039"}.glyphicon-barcode:before{content:"\e040"}.glyphicon-tag:before{content:"\e041"}.glyphicon-tags:before{content:"\e042"}.glyphicon-book:before{content:"\e043"}.glyphicon-bookmark:before{content:"\e044"}.glyphicon-print:before{content:"\e045"}.glyphicon-camera:before{content:"\e046"}.glyphicon-font:before{content:"\e047"}.glyphicon-bold:before{content:"\e048"}.glyphicon-italic:before{content:"\e049"}.glyphicon-text-height:before{content:"\e050"}.glyphicon-text-width:before{content:"\e051"}.glyphicon-align-left:before{content:"\e052"}.glyphicon-align-center:before{content:"\e053"}.glyphicon-align-right:before{content:"\e054"}.glyphicon-align-justify:before{content:"\e055"}.glyphicon-list:before{content:"\e056"}.glyphicon-indent-left:before{content:"\e057"}.glyphicon-indent-right:before{content:"\e058"}.glyphicon-facetime-video:before{content:"\e059"}.glyphicon-picture:before{content:"\e060"}.glyphicon-map-marker:before{content:"\e062"}.glyphicon-adjust:before{content:"\e063"}.glyphicon-tint:before{content:"\e064"}.glyphicon-edit:before{content:"\e065"}.glyphicon-share:before{content:"\e066"}.glyphicon-check:before{content:"\e067"}.glyphicon-move:before{content:"\e068"}.glyphicon-step-backward:before{content:"\e069"}.glyphicon-fast-backward:before{content:"\e070"}.glyphicon-backward:before{content:"\e071"}.glyphicon-play:before{content:"\e072"}.glyphicon-pause:before{content:"\e073"}.glyphicon-stop:before{content:"\e074"}.glyphicon-forward:before{content:"\e075"}.glyphicon-fast-forward:before{content:"\e076"}.glyphicon-step-forward:before{content:"\e077"}.glyphicon-eject:before{content:"\e078"}.glyphicon-chevron-left:before{content:"\e079"}.glyphicon-chevron-right:before{content:"\e080"}.glyphicon-plus-sign:before{content:"\e081"}.glyphicon-minus-sign:before{content:"\e082"}.glyphicon-remove-sign:before{content:"\e083"}.glyphicon-ok-sign:before{content:"\e084"}.glyphicon-question-sign:before{content:"\e085"}.glyphicon-info-sign:before{content:"\e086"}.glyphicon-screenshot:before{content:"\e087"}.glyphicon-remove-circle:before{content:"\e088"}.glyphicon-ok-circle:before{content:"\e089"}.glyphicon-ban-circle:before{content:"\e090"}.glyphicon-arrow-left:before{content:"\e091"}.glyphicon-arrow-right:before{content:"\e092"}.glyphicon-arrow-up:before{content:"\e093"}.glyphicon-arrow-down:before{content:"\e094"}.glyphicon-share-alt:before{content:"\e095"}.glyphicon-resize-full:before{content:"\e096"}.glyphicon-resize-small:before{content:"\e097"}.glyphicon-exclamation-sign:before{content:"\e101"}.glyphicon-gift:before{content:"\e102"}.glyphicon-leaf:before{content:"\e103"}.glyphicon-fire:before{content:"\e104"}.glyphicon-eye-open:before{content:"\e105"}.glyphicon-eye-close:before{content:"\e106"}.glyphicon-warning-sign:before{content:"\e107"}.glyphicon-plane:before{content:"\e108"}.glyphicon-calendar:before{content:"\e109"}.glyphicon-random:before{content:"\e110"}.glyphicon-comment:before{content:"\e111"}.glyphicon-magnet:before{content:"\e112"}.glyphicon-chevron-up:before{content:"\e113"}.glyphicon-chevron-down:before{content:"\e114"}.glyphicon-retweet:before{content:"\e115"}.glyphicon-shopping-cart:before{content:"\e116"}.glyphicon-folder-close:before{content:"\e117"}.glyphicon-folder-open:before{content:"\e118"}.glyphicon-resize-vertical:before{content:"\e119"}.glyphicon-resize-horizontal:before{content:"\e120"}.glyphicon-hdd:before{content:"\e121"}.glyphicon-bullhorn:before{content:"\e122"}.glyphicon-bell:before{content:"\e123"}.glyphicon-certificate:before{content:"\e124"}.glyphicon-thumbs-up:before{content:"\e125"}.glyphicon-thumbs-down:before{content:"\e126"}.glyphicon-hand-right:before{content:"\e127"}.glyphicon-hand-left:before{content:"\e128"}.glyphicon-hand-up:before{content:"\e129"}.glyphicon-hand-down:before{content:"\e130"}.glyphicon-circle-arrow-right:before{content:"\e131"}.glyphicon-circle-arrow-left:before{content:"\e132"}.glyphicon-circle-arrow-up:before{content:"\e133"}.glyphicon-circle-arrow-down:before{content:"\e134"}.glyphicon-globe:before{content:"\e135"}.glyphicon-wrench:before{content:"\e136"}.glyphicon-tasks:before{content:"\e137"}.glyphicon-filter:before{content:"\e138"}.glyphicon-briefcase:before{content:"\e139"}.glyphicon-fullscreen:before{content:"\e140"}.glyphicon-dashboard:before{content:"\e141"}.glyphicon-paperclip:before{content:"\e142"}.glyphicon-heart-empty:before{content:"\e143"}.glyphicon-link:before{content:"\e144"}.glyphicon-phone:before{content:"\e145"}.glyphicon-pushpin:before{content:"\e146"}.glyphicon-usd:before{content:"\e148"}.glyphicon-gbp:before{content:"\e149"}.glyphicon-sort:before{content:"\e150"}.glyphicon-sort-by-alphabet:before{content:"\e151"}.glyphicon-sort-by-alphabet-alt:before{content:"\e152"}.glyphicon-sort-by-order:before{content:"\e153"}.glyphicon-sort-by-order-alt:before{content:"\e154"}.glyphicon-sort-by-attributes:before{content:"\e155"}.glyphicon-sort-by-attributes-alt:before{content:"\e156"}.glyphicon-unchecked:before{content:"\e157"}.glyphicon-expand:before{content:"\e158"}.glyphicon-collapse-down:before{content:"\e159"}.glyphicon-collapse-up:before{content:"\e160"}.glyphicon-log-in:before{content:"\e161"}.glyphicon-flash:before{content:"\e162"}.glyphicon-log-out:before{content:"\e163"}.glyphicon-new-window:before{content:"\e164"}.glyphicon-record:before{content:"\e165"}.glyphicon-save:before{content:"\e166"}.glyphicon-open:before{content:"\e167"}.glyphicon-saved:before{content:"\e168"}.glyphicon-import:before{content:"\e169"}.glyphicon-export:before{content:"\e170"}.glyphicon-send:before{content:"\e171"}.glyphicon-floppy-disk:before{content:"\e172"}.glyphicon-floppy-saved:before{content:"\e173"}.glyphicon-floppy-remove:before{content:"\e174"}.glyphicon-floppy-save:before{content:"\e175"}.glyphicon-floppy-open:before{content:"\e176"}.glyphicon-credit-card:before{content:"\e177"}.glyphicon-transfer:before{content:"\e178"}.glyphicon-cutlery:before{content:"\e179"}.glyphicon-header:before{content:"\e180"}.glyphicon-compressed:before{content:"\e181"}.glyphicon-earphone:before{content:"\e182"}.glyphicon-phone-alt:before{content:"\e183"}.glyphicon-tower:before{content:"\e184"}.glyphicon-stats:before{content:"\e185"}.glyphicon-sd-video:before{content:"\e186"}.glyphicon-hd-video:before{content:"\e187"}.glyphicon-subtitles:before{content:"\e188"}.glyphicon-sound-stereo:before{content:"\e189"}.glyphicon-sound-dolby:before{content:"\e190"}.glyphicon-sound-5-1:before{content:"\e191"}.glyphicon-sound-6-1:before{content:"\e192"}.glyphicon-sound-7-1:before{content:"\e193"}.glyphicon-copyright-mark:before{content:"\e194"}.glyphicon-registration-mark:before{content:"\e195"}.glyphicon-cloud-download:before{content:"\e197"}.glyphicon-cloud-upload:before{content:"\e198"}.glyphicon-tree-conifer:before{content:"\e199"}.glyphicon-tree-deciduous:before{content:"\e200"}*{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}*:before,*:after{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}html{font-size:10px;-webkit-tap-highlight-color:rgba(0,0,0,0)}body{font-family:"Ubuntu",Tahoma,"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:14px;line-height:1.42857143;color:#333333;background-color:#ffffff}input,button,select,textarea{font-family:inherit;font-size:inherit;line-height:inherit}a{color:#dd4814;text-decoration:none}a:hover,a:focus{color:#97310e;text-decoration:underline}a:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}figure{margin:0}img{vertical-align:middle}.img-responsive,.thumbnail>img,.thumbnail a>img,.carousel-inner>.item>img,.carousel-inner>.item>a>img{display:block;max-width:100%;height:auto}.img-rounded{border-radius:6px}.img-thumbnail{padding:4px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:all .2s ease-in-out;-o-transition:all .2s ease-in-out;transition:all .2s ease-in-out;display:inline-block;max-width:100%;height:auto}.img-circle{border-radius:50%}hr{margin-top:20px;margin-bottom:20px;border:0;border-top:1px solid #eeeeee}.sr-only{position:absolute;width:1px;height:1px;margin:-1px;padding:0;overflow:hidden;clip:rect(0, 0, 0, 0);border:0}.sr-only-focusable:active,.sr-only-focusable:focus{position:static;width:auto;height:auto;margin:0;overflow:visible;clip:auto}h1,h2,h3,h4,h5,h6,.h1,.h2,.h3,.h4,.h5,.h6{font-family:"Ubuntu",Tahoma,"Helvetica Neue",Helvetica,Arial,sans-serif;font-weight:500;line-height:1.1;color:inherit}h1 small,h2 small,h3 small,h4 small,h5 small,h6 small,.h1 small,.h2 small,.h3 small,.h4 small,.h5 small,.h6 small,h1 .small,h2 .small,h3 .small,h4 .small,h5 .small,h6 .small,.h1 .small,.h2 .small,.h3 .small,.h4 .small,.h5 .small,.h6 .small{font-weight:normal;line-height:1;color:#aea79f}h1,.h1,h2,.h2,h3,.h3{margin-top:20px;margin-bottom:10px}h1 small,.h1 small,h2 small,.h2 small,h3 small,.h3 small,h1 .small,.h1 .small,h2 .small,.h2 .small,h3 .small,.h3 .small{font-size:65%}h4,.h4,h5,.h5,h6,.h6{margin-top:10px;margin-bottom:10px}h4 small,.h4 small,h5 small,.h5 small,h6 small,.h6 small,h4 .small,.h4 .small,h5 .small,.h5 .small,h6 .small,.h6 .small{font-size:75%}h1,.h1{font-size:36px}h2,.h2{font-size:30px}h3,.h3{font-size:24px}h4,.h4{font-size:18px}h5,.h5{font-size:14px}h6,.h6{font-size:12px}p{margin:0 0 10px}.lead{margin-bottom:20px;font-size:16px;font-weight:300;line-height:1.4}@media (min-width:768px){.lead{font-size:21px}}small,.small{font-size:85%}mark,.mark{background-color:#fcf8e3;padding:.2em}.text-left{text-align:left}.text-right{text-align:right}.text-center{text-align:center}.text-justify{text-align:justify}.text-nowrap{white-space:nowrap}.text-lowercase{text-transform:lowercase}.text-uppercase{text-transform:uppercase}.text-capitalize{text-transform:capitalize}.text-muted{color:#aea79f}.text-primary{color:#dd4814}a.text-primary:hover{color:#ae3910}.text-success{color:#468847}a.text-success:hover{color:#356635}.text-info{color:#3a87ad}a.text-info:hover{color:#2d6987}.text-warning{color:#c09853}a.text-warning:hover{color:#a47e3c}.text-danger{color:#b94a48}a.text-danger:hover{color:#953b39}.bg-primary{color:#fff;background-color:#dd4814}a.bg-primary:hover{background-color:#ae3910}.bg-success{background-color:#dff0d8}a.bg-success:hover{background-color:#c1e2b3}.bg-info{background-color:#d9edf7}a.bg-info:hover{background-color:#afd9ee}.bg-warning{background-color:#fcf8e3}a.bg-warning:hover{background-color:#f7ecb5}.bg-danger{background-color:#f2dede}a.bg-danger:hover{background-color:#e4b9b9}.page-header{padding-bottom:9px;margin:40px 0 20px;border-bottom:1px solid #eeeeee}ul,ol{margin-top:0;margin-bottom:10px}ul ul,ol ul,ul ol,ol ol{margin-bottom:0}.list-unstyled{padding-left:0;list-style:none}.list-inline{padding-left:0;list-style:none;margin-left:-5px}.list-inline>li{display:inline-block;padding-left:5px;padding-right:5px}dl{margin-top:0;margin-bottom:20px}dt,dd{line-height:1.42857143}dt{font-weight:bold}dd{margin-left:0}@media (min-width:768px){.dl-horizontal dt{float:left;width:160px;clear:left;text-align:right;overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.dl-horizontal dd{margin-left:180px}}abbr[title],abbr[data-original-title]{cursor:help;border-bottom:1px dotted #aea79f}.initialism{font-size:90%;text-transform:uppercase}blockquote{padding:10px 20px;margin:0 0 20px;font-size:17.5px;border-left:5px solid #eeeeee}blockquote p:last-child,blockquote ul:last-child,blockquote ol:last-child{margin-bottom:0}blockquote footer,blockquote small,blockquote .small{display:block;font-size:80%;line-height:1.42857143;color:#aea79f}blockquote footer:before,blockquote small:before,blockquote .small:before{content:'\2014 \00A0'}.blockquote-reverse,blockquote.pull-right{padding-right:15px;padding-left:0;border-right:5px solid #eeeeee;border-left:0;text-align:right}.blockquote-reverse footer:before,blockquote.pull-right footer:before,.blockquote-reverse small:before,blockquote.pull-right small:before,.blockquote-reverse .small:before,blockquote.pull-right .small:before{content:''}.blockquote-reverse footer:after,blockquote.pull-right footer:after,.blockquote-reverse small:after,blockquote.pull-right small:after,.blockquote-reverse .small:after,blockquote.pull-right .small:after{content:'\00A0 \2014'}address{margin-bottom:20px;font-style:normal;line-height:1.42857143}code,kbd,pre,samp{font-family:monospace}code{padding:2px 4px;font-size:90%;color:#c7254e;background-color:#f9f2f4;border-radius:4px}kbd{padding:2px 4px;font-size:90%;color:#ffffff;background-color:#333333;border-radius:3px;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.25)}kbd kbd{padding:0;font-size:100%;font-weight:bold;-webkit-box-shadow:none;box-shadow:none}pre{display:block;padding:9.5px;margin:0 0 10px;font-size:13px;line-height:1.42857143;word-break:break-all;word-wrap:break-word;color:#333333;background-color:#f5f5f5;border:1px solid #cccccc;border-radius:4px}pre code{padding:0;font-size:inherit;color:inherit;white-space:pre-wrap;background-color:transparent;border-radius:0}.pre-scrollable{max-height:340px;overflow-y:scroll}.container{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}@media (min-width:768px){.container{width:750px}}@media (min-width:992px){.container{width:970px}}@media (min-width:1200px){.container{width:1170px}}.container-fluid{margin-right:auto;margin-left:auto;padding-left:15px;padding-right:15px}.row{margin-left:-15px;margin-right:-15px}.col-xs-1,.col-sm-1,.col-md-1,.col-lg-1,.col-xs-2,.col-sm-2,.col-md-2,.col-lg-2,.col-xs-3,.col-sm-3,.col-md-3,.col-lg-3,.col-xs-4,.col-sm-4,.col-md-4,.col-lg-4,.col-xs-5,.col-sm-5,.col-md-5,.col-lg-5,.col-xs-6,.col-sm-6,.col-md-6,.col-lg-6,.col-xs-7,.col-sm-7,.col-md-7,.col-lg-7,.col-xs-8,.col-sm-8,.col-md-8,.col-lg-8,.col-xs-9,.col-sm-9,.col-md-9,.col-lg-9,.col-xs-10,.col-sm-10,.col-md-10,.col-lg-10,.col-xs-11,.col-sm-11,.col-md-11,.col-lg-11,.col-xs-12,.col-sm-12,.col-md-12,.col-lg-12{position:relative;min-height:1px;padding-left:15px;padding-right:15px}.col-xs-1,.col-xs-2,.col-xs-3,.col-xs-4,.col-xs-5,.col-xs-6,.col-xs-7,.col-xs-8,.col-xs-9,.col-xs-10,.col-xs-11,.col-xs-12{float:left}.col-xs-12{width:100%}.col-xs-11{width:91.66666667%}.col-xs-10{width:83.33333333%}.col-xs-9{width:75%}.col-xs-8{width:66.66666667%}.col-xs-7{width:58.33333333%}.col-xs-6{width:50%}.col-xs-5{width:41.66666667%}.col-xs-4{width:33.33333333%}.col-xs-3{width:25%}.col-xs-2{width:16.66666667%}.col-xs-1{width:8.33333333%}.col-xs-pull-12{right:100%}.col-xs-pull-11{right:91.66666667%}.col-xs-pull-10{right:83.33333333%}.col-xs-pull-9{right:75%}.col-xs-pull-8{right:66.66666667%}.col-xs-pull-7{right:58.33333333%}.col-xs-pull-6{right:50%}.col-xs-pull-5{right:41.66666667%}.col-xs-pull-4{right:33.33333333%}.col-xs-pull-3{right:25%}.col-xs-pull-2{right:16.66666667%}.col-xs-pull-1{right:8.33333333%}.col-xs-pull-0{right:auto}.col-xs-push-12{left:100%}.col-xs-push-11{left:91.66666667%}.col-xs-push-10{left:83.33333333%}.col-xs-push-9{left:75%}.col-xs-push-8{left:66.66666667%}.col-xs-push-7{left:58.33333333%}.col-xs-push-6{left:50%}.col-xs-push-5{left:41.66666667%}.col-xs-push-4{left:33.33333333%}.col-xs-push-3{left:25%}.col-xs-push-2{left:16.66666667%}.col-xs-push-1{left:8.33333333%}.col-xs-push-0{left:auto}.col-xs-offset-12{margin-left:100%}.col-xs-offset-11{margin-left:91.66666667%}.col-xs-offset-10{margin-left:83.33333333%}.col-xs-offset-9{margin-left:75%}.col-xs-offset-8{margin-left:66.66666667%}.col-xs-offset-7{margin-left:58.33333333%}.col-xs-offset-6{margin-left:50%}.col-xs-offset-5{margin-left:41.66666667%}.col-xs-offset-4{margin-left:33.33333333%}.col-xs-offset-3{margin-left:25%}.col-xs-offset-2{margin-left:16.66666667%}.col-xs-offset-1{margin-left:8.33333333%}.col-xs-offset-0{margin-left:0%}@media (min-width:768px){.col-sm-1,.col-sm-2,.col-sm-3,.col-sm-4,.col-sm-5,.col-sm-6,.col-sm-7,.col-sm-8,.col-sm-9,.col-sm-10,.col-sm-11,.col-sm-12{float:left}.col-sm-12{width:100%}.col-sm-11{width:91.66666667%}.col-sm-10{width:83.33333333%}.col-sm-9{width:75%}.col-sm-8{width:66.66666667%}.col-sm-7{width:58.33333333%}.col-sm-6{width:50%}.col-sm-5{width:41.66666667%}.col-sm-4{width:33.33333333%}.col-sm-3{width:25%}.col-sm-2{width:16.66666667%}.col-sm-1{width:8.33333333%}.col-sm-pull-12{right:100%}.col-sm-pull-11{right:91.66666667%}.col-sm-pull-10{right:83.33333333%}.col-sm-pull-9{right:75%}.col-sm-pull-8{right:66.66666667%}.col-sm-pull-7{right:58.33333333%}.col-sm-pull-6{right:50%}.col-sm-pull-5{right:41.66666667%}.col-sm-pull-4{right:33.33333333%}.col-sm-pull-3{right:25%}.col-sm-pull-2{right:16.66666667%}.col-sm-pull-1{right:8.33333333%}.col-sm-pull-0{right:auto}.col-sm-push-12{left:100%}.col-sm-push-11{left:91.66666667%}.col-sm-push-10{left:83.33333333%}.col-sm-push-9{left:75%}.col-sm-push-8{left:66.66666667%}.col-sm-push-7{left:58.33333333%}.col-sm-push-6{left:50%}.col-sm-push-5{left:41.66666667%}.col-sm-push-4{left:33.33333333%}.col-sm-push-3{left:25%}.col-sm-push-2{left:16.66666667%}.col-sm-push-1{left:8.33333333%}.col-sm-push-0{left:auto}.col-sm-offset-12{margin-left:100%}.col-sm-offset-11{margin-left:91.66666667%}.col-sm-offset-10{margin-left:83.33333333%}.col-sm-offset-9{margin-left:75%}.col-sm-offset-8{margin-left:66.66666667%}.col-sm-offset-7{margin-left:58.33333333%}.col-sm-offset-6{margin-left:50%}.col-sm-offset-5{margin-left:41.66666667%}.col-sm-offset-4{margin-left:33.33333333%}.col-sm-offset-3{margin-left:25%}.col-sm-offset-2{margin-left:16.66666667%}.col-sm-offset-1{margin-left:8.33333333%}.col-sm-offset-0{margin-left:0%}}@media (min-width:992px){.col-md-1,.col-md-2,.col-md-3,.col-md-4,.col-md-5,.col-md-6,.col-md-7,.col-md-8,.col-md-9,.col-md-10,.col-md-11,.col-md-12{float:left}.col-md-12{width:100%}.col-md-11{width:91.66666667%}.col-md-10{width:83.33333333%}.col-md-9{width:75%}.col-md-8{width:66.66666667%}.col-md-7{width:58.33333333%}.col-md-6{width:50%}.col-md-5{width:41.66666667%}.col-md-4{width:33.33333333%}.col-md-3{width:25%}.col-md-2{width:16.66666667%}.col-md-1{width:8.33333333%}.col-md-pull-12{right:100%}.col-md-pull-11{right:91.66666667%}.col-md-pull-10{right:83.33333333%}.col-md-pull-9{right:75%}.col-md-pull-8{right:66.66666667%}.col-md-pull-7{right:58.33333333%}.col-md-pull-6{right:50%}.col-md-pull-5{right:41.66666667%}.col-md-pull-4{right:33.33333333%}.col-md-pull-3{right:25%}.col-md-pull-2{right:16.66666667%}.col-md-pull-1{right:8.33333333%}.col-md-pull-0{right:auto}.col-md-push-12{left:100%}.col-md-push-11{left:91.66666667%}.col-md-push-10{left:83.33333333%}.col-md-push-9{left:75%}.col-md-push-8{left:66.66666667%}.col-md-push-7{left:58.33333333%}.col-md-push-6{left:50%}.col-md-push-5{left:41.66666667%}.col-md-push-4{left:33.33333333%}.col-md-push-3{left:25%}.col-md-push-2{left:16.66666667%}.col-md-push-1{left:8.33333333%}.col-md-push-0{left:auto}.col-md-offset-12{margin-left:100%}.col-md-offset-11{margin-left:91.66666667%}.col-md-offset-10{margin-left:83.33333333%}.col-md-offset-9{margin-left:75%}.col-md-offset-8{margin-left:66.66666667%}.col-md-offset-7{margin-left:58.33333333%}.col-md-offset-6{margin-left:50%}.col-md-offset-5{margin-left:41.66666667%}.col-md-offset-4{margin-left:33.33333333%}.col-md-offset-3{margin-left:25%}.col-md-offset-2{margin-left:16.66666667%}.col-md-offset-1{margin-left:8.33333333%}.col-md-offset-0{margin-left:0%}}@media (min-width:1200px){.col-lg-1,.col-lg-2,.col-lg-3,.col-lg-4,.col-lg-5,.col-lg-6,.col-lg-7,.col-lg-8,.col-lg-9,.col-lg-10,.col-lg-11,.col-lg-12{float:left}.col-lg-12{width:100%}.col-lg-11{width:91.66666667%}.col-lg-10{width:83.33333333%}.col-lg-9{width:75%}.col-lg-8{width:66.66666667%}.col-lg-7{width:58.33333333%}.col-lg-6{width:50%}.col-lg-5{width:41.66666667%}.col-lg-4{width:33.33333333%}.col-lg-3{width:25%}.col-lg-2{width:16.66666667%}.col-lg-1{width:8.33333333%}.col-lg-pull-12{right:100%}.col-lg-pull-11{right:91.66666667%}.col-lg-pull-10{right:83.33333333%}.col-lg-pull-9{right:75%}.col-lg-pull-8{right:66.66666667%}.col-lg-pull-7{right:58.33333333%}.col-lg-pull-6{right:50%}.col-lg-pull-5{right:41.66666667%}.col-lg-pull-4{right:33.33333333%}.col-lg-pull-3{right:25%}.col-lg-pull-2{right:16.66666667%}.col-lg-pull-1{right:8.33333333%}.col-lg-pull-0{right:auto}.col-lg-push-12{left:100%}.col-lg-push-11{left:91.66666667%}.col-lg-push-10{left:83.33333333%}.col-lg-push-9{left:75%}.col-lg-push-8{left:66.66666667%}.col-lg-push-7{left:58.33333333%}.col-lg-push-6{left:50%}.col-lg-push-5{left:41.66666667%}.col-lg-push-4{left:33.33333333%}.col-lg-push-3{left:25%}.col-lg-push-2{left:16.66666667%}.col-lg-push-1{left:8.33333333%}.col-lg-push-0{left:auto}.col-lg-offset-12{margin-left:100%}.col-lg-offset-11{margin-left:91.66666667%}.col-lg-offset-10{margin-left:83.33333333%}.col-lg-offset-9{margin-left:75%}.col-lg-offset-8{margin-left:66.66666667%}.col-lg-offset-7{margin-left:58.33333333%}.col-lg-offset-6{margin-left:50%}.col-lg-offset-5{margin-left:41.66666667%}.col-lg-offset-4{margin-left:33.33333333%}.col-lg-offset-3{margin-left:25%}.col-lg-offset-2{margin-left:16.66666667%}.col-lg-offset-1{margin-left:8.33333333%}.col-lg-offset-0{margin-left:0%}}table{background-color:transparent}caption{padding-top:8px;padding-bottom:8px;color:#aea79f;text-align:left}th{}.table{width:100%;max-width:100%;margin-bottom:20px}.table>thead>tr>th,.table>tbody>tr>th,.table>tfoot>tr>th,.table>thead>tr>td,.table>tbody>tr>td,.table>tfoot>tr>td{padding:8px;line-height:1.42857143;vertical-align:top;border-top:1px solid #dddddd}.table>thead>tr>th{vertical-align:bottom;border-bottom:2px solid #dddddd}.table>caption+thead>tr:first-child>th,.table>colgroup+thead>tr:first-child>th,.table>thead:first-child>tr:first-child>th,.table>caption+thead>tr:first-child>td,.table>colgroup+thead>tr:first-child>td,.table>thead:first-child>tr:first-child>td{border-top:0}.table>tbody+tbody{border-top:2px solid #dddddd}.table .table{background-color:#ffffff}.table-condensed>thead>tr>th,.table-condensed>tbody>tr>th,.table-condensed>tfoot>tr>th,.table-condensed>thead>tr>td,.table-condensed>tbody>tr>td,.table-condensed>tfoot>tr>td{padding:5px}.table-bordered{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>tbody>tr>th,.table-bordered>tfoot>tr>th,.table-bordered>thead>tr>td,.table-bordered>tbody>tr>td,.table-bordered>tfoot>tr>td{border:1px solid #dddddd}.table-bordered>thead>tr>th,.table-bordered>thead>tr>td{border-bottom-width:2px}.table-striped>tbody>tr:nth-child(odd){background-color:#f9f9f9}.table-hover>tbody>tr:hover{background-color:#f5f5f5}table col[class*="col-"]{position:static;float:none;display:table-column}table td[class*="col-"],table th[class*="col-"]{position:static;float:none;display:table-cell}.table>thead>tr>td.active,.table>tbody>tr>td.active,.table>tfoot>tr>td.active,.table>thead>tr>th.active,.table>tbody>tr>th.active,.table>tfoot>tr>th.active,.table>thead>tr.active>td,.table>tbody>tr.active>td,.table>tfoot>tr.active>td,.table>thead>tr.active>th,.table>tbody>tr.active>th,.table>tfoot>tr.active>th{background-color:#f5f5f5}.table-hover>tbody>tr>td.active:hover,.table-hover>tbody>tr>th.active:hover,.table-hover>tbody>tr.active:hover>td,.table-hover>tbody>tr:hover>.active,.table-hover>tbody>tr.active:hover>th{background-color:#e8e8e8}.table>thead>tr>td.success,.table>tbody>tr>td.success,.table>tfoot>tr>td.success,.table>thead>tr>th.success,.table>tbody>tr>th.success,.table>tfoot>tr>th.success,.table>thead>tr.success>td,.table>tbody>tr.success>td,.table>tfoot>tr.success>td,.table>thead>tr.success>th,.table>tbody>tr.success>th,.table>tfoot>tr.success>th{background-color:#dff0d8}.table-hover>tbody>tr>td.success:hover,.table-hover>tbody>tr>th.success:hover,.table-hover>tbody>tr.success:hover>td,.table-hover>tbody>tr:hover>.success,.table-hover>tbody>tr.success:hover>th{background-color:#d0e9c6}.table>thead>tr>td.info,.table>tbody>tr>td.info,.table>tfoot>tr>td.info,.table>thead>tr>th.info,.table>tbody>tr>th.info,.table>tfoot>tr>th.info,.table>thead>tr.info>td,.table>tbody>tr.info>td,.table>tfoot>tr.info>td,.table>thead>tr.info>th,.table>tbody>tr.info>th,.table>tfoot>tr.info>th{background-color:#d9edf7}.table-hover>tbody>tr>td.info:hover,.table-hover>tbody>tr>th.info:hover,.table-hover>tbody>tr.info:hover>td,.table-hover>tbody>tr:hover>.info,.table-hover>tbody>tr.info:hover>th{background-color:#c4e3f3}.table>thead>tr>td.warning,.table>tbody>tr>td.warning,.table>tfoot>tr>td.warning,.table>thead>tr>th.warning,.table>tbody>tr>th.warning,.table>tfoot>tr>th.warning,.table>thead>tr.warning>td,.table>tbody>tr.warning>td,.table>tfoot>tr.warning>td,.table>thead>tr.warning>th,.table>tbody>tr.warning>th,.table>tfoot>tr.warning>th{background-color:#fcf8e3}.table-hover>tbody>tr>td.warning:hover,.table-hover>tbody>tr>th.warning:hover,.table-hover>tbody>tr.warning:hover>td,.table-hover>tbody>tr:hover>.warning,.table-hover>tbody>tr.warning:hover>th{background-color:#faf2cc}.table>thead>tr>td.danger,.table>tbody>tr>td.danger,.table>tfoot>tr>td.danger,.table>thead>tr>th.danger,.table>tbody>tr>th.danger,.table>tfoot>tr>th.danger,.table>thead>tr.danger>td,.table>tbody>tr.danger>td,.table>tfoot>tr.danger>td,.table>thead>tr.danger>th,.table>tbody>tr.danger>th,.table>tfoot>tr.danger>th{background-color:#f2dede}.table-hover>tbody>tr>td.danger:hover,.table-hover>tbody>tr>th.danger:hover,.table-hover>tbody>tr.danger:hover>td,.table-hover>tbody>tr:hover>.danger,.table-hover>tbody>tr.danger:hover>th{background-color:#ebcccc}.table-responsive{overflow-x:auto;min-height:0.01%}@media screen and (max-width:767px){.table-responsive{width:100%;margin-bottom:15px;overflow-y:hidden;-ms-overflow-style:-ms-autohiding-scrollbar;border:1px solid #dddddd}.table-responsive>.table{margin-bottom:0}.table-responsive>.table>thead>tr>th,.table-responsive>.table>tbody>tr>th,.table-responsive>.table>tfoot>tr>th,.table-responsive>.table>thead>tr>td,.table-responsive>.table>tbody>tr>td,.table-responsive>.table>tfoot>tr>td{white-space:nowrap}.table-responsive>.table-bordered{border:0}.table-responsive>.table-bordered>thead>tr>th:first-child,.table-responsive>.table-bordered>tbody>tr>th:first-child,.table-responsive>.table-bordered>tfoot>tr>th:first-child,.table-responsive>.table-bordered>thead>tr>td:first-child,.table-responsive>.table-bordered>tbody>tr>td:first-child,.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.table-responsive>.table-bordered>thead>tr>th:last-child,.table-responsive>.table-bordered>tbody>tr>th:last-child,.table-responsive>.table-bordered>tfoot>tr>th:last-child,.table-responsive>.table-bordered>thead>tr>td:last-child,.table-responsive>.table-bordered>tbody>tr>td:last-child,.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.table-responsive>.table-bordered>tbody>tr:last-child>th,.table-responsive>.table-bordered>tfoot>tr:last-child>th,.table-responsive>.table-bordered>tbody>tr:last-child>td,.table-responsive>.table-bordered>tfoot>tr:last-child>td{border-bottom:0}}fieldset{padding:0;margin:0;border:0;min-width:0}legend{display:block;width:100%;padding:0;margin-bottom:20px;font-size:21px;line-height:inherit;color:#333333;border:0;border-bottom:1px solid #e5e5e5}label{display:inline-block;max-width:100%;margin-bottom:5px;font-weight:bold}input[type="search"]{-webkit-box-sizing:border-box;-moz-box-sizing:border-box;box-sizing:border-box}input[type="radio"],input[type="checkbox"]{margin:4px 0 0;margin-top:1px \9;line-height:normal}input[type="file"]{display:block}input[type="range"]{display:block;width:100%}select[multiple],select[size]{height:auto}input[type="file"]:focus,input[type="radio"]:focus,input[type="checkbox"]:focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}output{display:block;padding-top:9px;font-size:14px;line-height:1.42857143;color:#333333}.form-control{display:block;width:100%;height:38px;padding:8px 12px;font-size:14px;line-height:1.42857143;color:#333333;background-color:#ffffff;background-image:none;border:1px solid #cccccc;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);-webkit-transition:border-color ease-in-out .15s,-webkit-box-shadow ease-in-out .15s;-o-transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s;transition:border-color ease-in-out .15s,box-shadow ease-in-out .15s}.form-control:focus{border-color:#66afe9;outline:0;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 8px rgba(102,175,233,0.6)}.form-control::-moz-placeholder{color:#aea79f;opacity:1}.form-control:-ms-input-placeholder{color:#aea79f}.form-control::-webkit-input-placeholder{color:#aea79f}.form-control[disabled],.form-control[readonly],fieldset[disabled] .form-control{cursor:not-allowed;background-color:#eeeeee;opacity:1}textarea.form-control{height:auto}input[type="search"]{-webkit-appearance:none}@media screen and (-webkit-min-device-pixel-ratio:0){input[type="date"],input[type="time"],input[type="datetime-local"],input[type="month"]{line-height:38px}input[type="date"].input-sm,input[type="time"].input-sm,input[type="datetime-local"].input-sm,input[type="month"].input-sm{line-height:30px}input[type="date"].input-lg,input[type="time"].input-lg,input[type="datetime-local"].input-lg,input[type="month"].input-lg{line-height:54px}}.form-group{margin-bottom:15px}.radio,.checkbox{position:relative;display:block;margin-top:10px;margin-bottom:10px}.radio label,.checkbox label{min-height:20px;padding-left:20px;margin-bottom:0;font-weight:normal;cursor:pointer}.radio input[type="radio"],.radio-inline input[type="radio"],.checkbox input[type="checkbox"],.checkbox-inline input[type="checkbox"]{position:absolute;margin-left:-20px;margin-top:4px \9}.radio+.radio,.checkbox+.checkbox{margin-top:-5px}.radio-inline,.checkbox-inline{display:inline-block;padding-left:20px;margin-bottom:0;vertical-align:middle;font-weight:normal;cursor:pointer}.radio-inline+.radio-inline,.checkbox-inline+.checkbox-inline{margin-top:0;margin-left:10px}input[type="radio"][disabled],input[type="checkbox"][disabled],input[type="radio"].disabled,input[type="checkbox"].disabled,fieldset[disabled] input[type="radio"],fieldset[disabled] input[type="checkbox"]{cursor:not-allowed}.radio-inline.disabled,.checkbox-inline.disabled,fieldset[disabled] .radio-inline,fieldset[disabled] .checkbox-inline{cursor:not-allowed}.radio.disabled label,.checkbox.disabled label,fieldset[disabled] .radio label,fieldset[disabled] .checkbox label{cursor:not-allowed}.form-control-static{padding-top:9px;padding-bottom:9px;margin-bottom:0}.form-control-static.input-lg,.form-control-static.input-sm{padding-left:0;padding-right:0}.input-sm,.form-group-sm .form-control{height:30px;padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}select.input-sm,select.form-group-sm .form-control{height:30px;line-height:30px}textarea.input-sm,textarea.form-group-sm .form-control,select[multiple].input-sm,select[multiple].form-group-sm .form-control{height:auto}.input-lg,.form-group-lg .form-control{height:54px;padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}select.input-lg,select.form-group-lg .form-control{height:54px;line-height:54px}textarea.input-lg,textarea.form-group-lg .form-control,select[multiple].input-lg,select[multiple].form-group-lg .form-control{height:auto}.has-feedback{position:relative}.has-feedback .form-control{padding-right:47.5px}.form-control-feedback{position:absolute;top:0;right:0;z-index:2;display:block;width:38px;height:38px;line-height:38px;text-align:center;pointer-events:none}.input-lg+.form-control-feedback{width:54px;height:54px;line-height:54px}.input-sm+.form-control-feedback{width:30px;height:30px;line-height:30px}.has-success .help-block,.has-success .control-label,.has-success .radio,.has-success .checkbox,.has-success .radio-inline,.has-success .checkbox-inline,.has-success.radio label,.has-success.checkbox label,.has-success.radio-inline label,.has-success.checkbox-inline label{color:#468847}.has-success .form-control{border-color:#468847;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-success .form-control:focus{border-color:#356635;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #7aba7b;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #7aba7b}.has-success .input-group-addon{color:#468847;border-color:#468847;background-color:#dff0d8}.has-success .form-control-feedback{color:#468847}.has-warning .help-block,.has-warning .control-label,.has-warning .radio,.has-warning .checkbox,.has-warning .radio-inline,.has-warning .checkbox-inline,.has-warning.radio label,.has-warning.checkbox label,.has-warning.radio-inline label,.has-warning.checkbox-inline label{color:#c09853}.has-warning .form-control{border-color:#c09853;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-warning .form-control:focus{border-color:#a47e3c;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #dbc59e;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #dbc59e}.has-warning .input-group-addon{color:#c09853;border-color:#c09853;background-color:#fcf8e3}.has-warning .form-control-feedback{color:#c09853}.has-error .help-block,.has-error .control-label,.has-error .radio,.has-error .checkbox,.has-error .radio-inline,.has-error .checkbox-inline,.has-error.radio label,.has-error.checkbox label,.has-error.radio-inline label,.has-error.checkbox-inline label{color:#b94a48}.has-error .form-control{border-color:#b94a48;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075);box-shadow:inset 0 1px 1px rgba(0,0,0,0.075)}.has-error .form-control:focus{border-color:#953b39;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #d59392;box-shadow:inset 0 1px 1px rgba(0,0,0,0.075),0 0 6px #d59392}.has-error .input-group-addon{color:#b94a48;border-color:#b94a48;background-color:#f2dede}.has-error .form-control-feedback{color:#b94a48}.has-feedback label~.form-control-feedback{top:25px}.has-feedback label.sr-only~.form-control-feedback{top:0}.help-block{display:block;margin-top:5px;margin-bottom:10px;color:#737373}@media (min-width:768px){.form-inline .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.form-inline .form-control{display:inline-block;width:auto;vertical-align:middle}.form-inline .form-control-static{display:inline-block}.form-inline .input-group{display:inline-table;vertical-align:middle}.form-inline .input-group .input-group-addon,.form-inline .input-group .input-group-btn,.form-inline .input-group .form-control{width:auto}.form-inline .input-group>.form-control{width:100%}.form-inline .control-label{margin-bottom:0;vertical-align:middle}.form-inline .radio,.form-inline .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.form-inline .radio label,.form-inline .checkbox label{padding-left:0}.form-inline .radio input[type="radio"],.form-inline .checkbox input[type="checkbox"]{position:relative;margin-left:0}.form-inline .has-feedback .form-control-feedback{top:0}}.form-horizontal .radio,.form-horizontal .checkbox,.form-horizontal .radio-inline,.form-horizontal .checkbox-inline{margin-top:0;margin-bottom:0;padding-top:9px}.form-horizontal .radio,.form-horizontal .checkbox{min-height:29px}.form-horizontal .form-group{margin-left:-15px;margin-right:-15px}@media (min-width:768px){.form-horizontal .control-label{text-align:right;margin-bottom:0;padding-top:9px}}.form-horizontal .has-feedback .form-control-feedback{right:15px}@media (min-width:768px){.form-horizontal .form-group-lg .control-label{padding-top:19.62px}}@media (min-width:768px){.form-horizontal .form-group-sm .control-label{padding-top:6px}}.btn{display:inline-block;margin-bottom:0;font-weight:normal;text-align:center;vertical-align:middle;-ms-touch-action:manipulation;touch-action:manipulation;cursor:pointer;background-image:none;border:1px solid transparent;white-space:nowrap;padding:8px 12px;font-size:14px;line-height:1.42857143;border-radius:4px;-webkit-user-select:none;-moz-user-select:none;-ms-user-select:none;user-select:none}.btn:focus,.btn:active:focus,.btn.active:focus,.btn.focus,.btn:active.focus,.btn.active.focus{outline:thin dotted;outline:5px auto -webkit-focus-ring-color;outline-offset:-2px}.btn:hover,.btn:focus,.btn.focus{color:#ffffff;text-decoration:none}.btn:active,.btn.active{outline:0;background-image:none;-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn.disabled,.btn[disabled],fieldset[disabled] .btn{cursor:not-allowed;pointer-events:none;opacity:0.65;filter:alpha(opacity=65);-webkit-box-shadow:none;box-shadow:none}.btn-default{color:#ffffff;background-color:#aea79f;border-color:#aea79f}.btn-default:hover,.btn-default:focus,.btn-default.focus,.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{color:#ffffff;background-color:#978e83;border-color:#92897e}.btn-default:active,.btn-default.active,.open>.dropdown-toggle.btn-default{background-image:none}.btn-default.disabled,.btn-default[disabled],fieldset[disabled] .btn-default,.btn-default.disabled:hover,.btn-default[disabled]:hover,fieldset[disabled] .btn-default:hover,.btn-default.disabled:focus,.btn-default[disabled]:focus,fieldset[disabled] .btn-default:focus,.btn-default.disabled.focus,.btn-default[disabled].focus,fieldset[disabled] .btn-default.focus,.btn-default.disabled:active,.btn-default[disabled]:active,fieldset[disabled] .btn-default:active,.btn-default.disabled.active,.btn-default[disabled].active,fieldset[disabled] .btn-default.active{background-color:#aea79f;border-color:#aea79f}.btn-default .badge{color:#aea79f;background-color:#ffffff}.btn-primary{color:#ffffff;background-color:#dd4814;border-color:#dd4814}.btn-primary:hover,.btn-primary:focus,.btn-primary.focus,.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{color:#ffffff;background-color:#ae3910;border-color:#a5360f}.btn-primary:active,.btn-primary.active,.open>.dropdown-toggle.btn-primary{background-image:none}.btn-primary.disabled,.btn-primary[disabled],fieldset[disabled] .btn-primary,.btn-primary.disabled:hover,.btn-primary[disabled]:hover,fieldset[disabled] .btn-primary:hover,.btn-primary.disabled:focus,.btn-primary[disabled]:focus,fieldset[disabled] .btn-primary:focus,.btn-primary.disabled.focus,.btn-primary[disabled].focus,fieldset[disabled] .btn-primary.focus,.btn-primary.disabled:active,.btn-primary[disabled]:active,fieldset[disabled] .btn-primary:active,.btn-primary.disabled.active,.btn-primary[disabled].active,fieldset[disabled] .btn-primary.active{background-color:#dd4814;border-color:#dd4814}.btn-primary .badge{color:#dd4814;background-color:#ffffff}.btn-success{color:#ffffff;background-color:#38b44a;border-color:#38b44a}.btn-success:hover,.btn-success:focus,.btn-success.focus,.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{color:#ffffff;background-color:#2c8d3a;border-color:#298537}.btn-success:active,.btn-success.active,.open>.dropdown-toggle.btn-success{background-image:none}.btn-success.disabled,.btn-success[disabled],fieldset[disabled] .btn-success,.btn-success.disabled:hover,.btn-success[disabled]:hover,fieldset[disabled] .btn-success:hover,.btn-success.disabled:focus,.btn-success[disabled]:focus,fieldset[disabled] .btn-success:focus,.btn-success.disabled.focus,.btn-success[disabled].focus,fieldset[disabled] .btn-success.focus,.btn-success.disabled:active,.btn-success[disabled]:active,fieldset[disabled] .btn-success:active,.btn-success.disabled.active,.btn-success[disabled].active,fieldset[disabled] .btn-success.active{background-color:#38b44a;border-color:#38b44a}.btn-success .badge{color:#38b44a;background-color:#ffffff}.btn-info{color:#ffffff;background-color:#772953;border-color:#772953}.btn-info:hover,.btn-info:focus,.btn-info.focus,.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{color:#ffffff;background-color:#511c39;border-color:#491933}.btn-info:active,.btn-info.active,.open>.dropdown-toggle.btn-info{background-image:none}.btn-info.disabled,.btn-info[disabled],fieldset[disabled] .btn-info,.btn-info.disabled:hover,.btn-info[disabled]:hover,fieldset[disabled] .btn-info:hover,.btn-info.disabled:focus,.btn-info[disabled]:focus,fieldset[disabled] .btn-info:focus,.btn-info.disabled.focus,.btn-info[disabled].focus,fieldset[disabled] .btn-info.focus,.btn-info.disabled:active,.btn-info[disabled]:active,fieldset[disabled] .btn-info:active,.btn-info.disabled.active,.btn-info[disabled].active,fieldset[disabled] .btn-info.active{background-color:#772953;border-color:#772953}.btn-info .badge{color:#772953;background-color:#ffffff}.btn-warning{color:#ffffff;background-color:#efb73e;border-color:#efb73e}.btn-warning:hover,.btn-warning:focus,.btn-warning.focus,.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{color:#ffffff;background-color:#e7a413;border-color:#dd9d12}.btn-warning:active,.btn-warning.active,.open>.dropdown-toggle.btn-warning{background-image:none}.btn-warning.disabled,.btn-warning[disabled],fieldset[disabled] .btn-warning,.btn-warning.disabled:hover,.btn-warning[disabled]:hover,fieldset[disabled] .btn-warning:hover,.btn-warning.disabled:focus,.btn-warning[disabled]:focus,fieldset[disabled] .btn-warning:focus,.btn-warning.disabled.focus,.btn-warning[disabled].focus,fieldset[disabled] .btn-warning.focus,.btn-warning.disabled:active,.btn-warning[disabled]:active,fieldset[disabled] .btn-warning:active,.btn-warning.disabled.active,.btn-warning[disabled].active,fieldset[disabled] .btn-warning.active{background-color:#efb73e;border-color:#efb73e}.btn-warning .badge{color:#efb73e;background-color:#ffffff}.btn-danger{color:#ffffff;background-color:#df382c;border-color:#df382c}.btn-danger:hover,.btn-danger:focus,.btn-danger.focus,.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{color:#ffffff;background-color:#bc271c;border-color:#b3251b}.btn-danger:active,.btn-danger.active,.open>.dropdown-toggle.btn-danger{background-image:none}.btn-danger.disabled,.btn-danger[disabled],fieldset[disabled] .btn-danger,.btn-danger.disabled:hover,.btn-danger[disabled]:hover,fieldset[disabled] .btn-danger:hover,.btn-danger.disabled:focus,.btn-danger[disabled]:focus,fieldset[disabled] .btn-danger:focus,.btn-danger.disabled.focus,.btn-danger[disabled].focus,fieldset[disabled] .btn-danger.focus,.btn-danger.disabled:active,.btn-danger[disabled]:active,fieldset[disabled] .btn-danger:active,.btn-danger.disabled.active,.btn-danger[disabled].active,fieldset[disabled] .btn-danger.active{background-color:#df382c;border-color:#df382c}.btn-danger .badge{color:#df382c;background-color:#ffffff}.btn-link{color:#dd4814;font-weight:normal;border-radius:0}.btn-link,.btn-link:active,.btn-link.active,.btn-link[disabled],fieldset[disabled] .btn-link{background-color:transparent;-webkit-box-shadow:none;box-shadow:none}.btn-link,.btn-link:hover,.btn-link:focus,.btn-link:active{border-color:transparent}.btn-link:hover,.btn-link:focus{color:#97310e;text-decoration:underline;background-color:transparent}.btn-link[disabled]:hover,fieldset[disabled] .btn-link:hover,.btn-link[disabled]:focus,fieldset[disabled] .btn-link:focus{color:#aea79f;text-decoration:none}.btn-lg,.btn-group-lg>.btn{padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}.btn-sm,.btn-group-sm>.btn{padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}.btn-xs,.btn-group-xs>.btn{padding:1px 5px;font-size:12px;line-height:1.5;border-radius:3px}.btn-block{display:block;width:100%}.btn-block+.btn-block{margin-top:5px}input[type="submit"].btn-block,input[type="reset"].btn-block,input[type="button"].btn-block{width:100%}.fade{opacity:0;-webkit-transition:opacity 0.15s linear;-o-transition:opacity 0.15s linear;transition:opacity 0.15s linear}.fade.in{opacity:1}.collapse{display:none;visibility:hidden}.collapse.in{display:block;visibility:visible}tr.collapse.in{display:table-row}tbody.collapse.in{display:table-row-group}.collapsing{position:relative;height:0;overflow:hidden;-webkit-transition-property:height, visibility;-o-transition-property:height, visibility;transition-property:height, visibility;-webkit-transition-duration:0.35s;-o-transition-duration:0.35s;transition-duration:0.35s;-webkit-transition-timing-function:ease;-o-transition-timing-function:ease;transition-timing-function:ease}.caret{display:inline-block;width:0;height:0;margin-left:2px;vertical-align:middle;border-top:4px solid;border-right:4px solid transparent;border-left:4px solid transparent}.dropdown{position:relative}.dropdown-toggle:focus{outline:0}.dropdown-menu{position:absolute;top:100%;left:0;z-index:1000;display:none;float:left;min-width:160px;padding:5px 0;margin:2px 0 0;list-style:none;font-size:14px;text-align:left;background-color:#ffffff;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.15);border-radius:4px;-webkit-box-shadow:0 6px 12px rgba(0,0,0,0.175);box-shadow:0 6px 12px rgba(0,0,0,0.175);-webkit-background-clip:padding-box;background-clip:padding-box}.dropdown-menu.pull-right{right:0;left:auto}.dropdown-menu .divider{height:1px;margin:9px 0;overflow:hidden;background-color:#e5e5e5}.dropdown-menu>li>a{display:block;padding:3px 20px;clear:both;font-weight:normal;line-height:1.42857143;color:#333333;white-space:nowrap}.dropdown-menu>li>a:hover,.dropdown-menu>li>a:focus{text-decoration:none;color:#ffffff;background-color:#dd4814}.dropdown-menu>.active>a,.dropdown-menu>.active>a:hover,.dropdown-menu>.active>a:focus{color:#ffffff;text-decoration:none;outline:0;background-color:#dd4814}.dropdown-menu>.disabled>a,.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{color:#aea79f}.dropdown-menu>.disabled>a:hover,.dropdown-menu>.disabled>a:focus{text-decoration:none;background-color:transparent;background-image:none;filter:progid:DXImageTransform.Microsoft.gradient(enabled=false);cursor:not-allowed}.open>.dropdown-menu{display:block}.open>a{outline:0}.dropdown-menu-right{left:auto;right:0}.dropdown-menu-left{left:0;right:auto}.dropdown-header{display:block;padding:3px 20px;font-size:12px;line-height:1.42857143;color:#aea79f;white-space:nowrap}.dropdown-backdrop{position:fixed;left:0;right:0;bottom:0;top:0;z-index:990}.pull-right>.dropdown-menu{right:0;left:auto}.dropup .caret,.navbar-fixed-bottom .dropdown .caret{border-top:0;border-bottom:4px solid;content:""}.dropup .dropdown-menu,.navbar-fixed-bottom .dropdown .dropdown-menu{top:auto;bottom:100%;margin-bottom:1px}@media (min-width:768px){.navbar-right .dropdown-menu{left:auto;right:0}.navbar-right .dropdown-menu-left{left:0;right:auto}}.btn-group,.btn-group-vertical{position:relative;display:inline-block;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;float:left}.btn-group>.btn:hover,.btn-group-vertical>.btn:hover,.btn-group>.btn:focus,.btn-group-vertical>.btn:focus,.btn-group>.btn:active,.btn-group-vertical>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn.active{z-index:2}.btn-group .btn+.btn,.btn-group .btn+.btn-group,.btn-group .btn-group+.btn,.btn-group .btn-group+.btn-group{margin-left:-1px}.btn-toolbar{margin-left:-5px}.btn-toolbar .btn-group,.btn-toolbar .input-group{float:left}.btn-toolbar>.btn,.btn-toolbar>.btn-group,.btn-toolbar>.input-group{margin-left:5px}.btn-group>.btn:not(:first-child):not(:last-child):not(.dropdown-toggle){border-radius:0}.btn-group>.btn:first-child{margin-left:0}.btn-group>.btn:first-child:not(:last-child):not(.dropdown-toggle){border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn:last-child:not(:first-child),.btn-group>.dropdown-toggle:not(:first-child){border-bottom-left-radius:0;border-top-left-radius:0}.btn-group>.btn-group{float:left}.btn-group>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group>.btn-group:first-child>.btn:last-child,.btn-group>.btn-group:first-child>.dropdown-toggle{border-bottom-right-radius:0;border-top-right-radius:0}.btn-group>.btn-group:last-child>.btn:first-child{border-bottom-left-radius:0;border-top-left-radius:0}.btn-group .dropdown-toggle:active,.btn-group.open .dropdown-toggle{outline:0}.btn-group>.btn+.dropdown-toggle{padding-left:8px;padding-right:8px}.btn-group>.btn-lg+.dropdown-toggle{padding-left:12px;padding-right:12px}.btn-group.open .dropdown-toggle{-webkit-box-shadow:inset 0 3px 5px rgba(0,0,0,0.125);box-shadow:inset 0 3px 5px rgba(0,0,0,0.125)}.btn-group.open .dropdown-toggle.btn-link{-webkit-box-shadow:none;box-shadow:none}.btn .caret{margin-left:0}.btn-lg .caret{border-width:5px 5px 0;border-bottom-width:0}.dropup .btn-lg .caret{border-width:0 5px 5px}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group,.btn-group-vertical>.btn-group>.btn{display:block;float:none;width:100%;max-width:100%}.btn-group-vertical>.btn-group>.btn{float:none}.btn-group-vertical>.btn+.btn,.btn-group-vertical>.btn+.btn-group,.btn-group-vertical>.btn-group+.btn,.btn-group-vertical>.btn-group+.btn-group{margin-top:-1px;margin-left:0}.btn-group-vertical>.btn:not(:first-child):not(:last-child){border-radius:0}.btn-group-vertical>.btn:first-child:not(:last-child){border-top-right-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn:last-child:not(:first-child){border-bottom-left-radius:4px;border-top-right-radius:0;border-top-left-radius:0}.btn-group-vertical>.btn-group:not(:first-child):not(:last-child)>.btn{border-radius:0}.btn-group-vertical>.btn-group:first-child:not(:last-child)>.btn:last-child,.btn-group-vertical>.btn-group:first-child:not(:last-child)>.dropdown-toggle{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn-group:last-child:not(:first-child)>.btn:first-child{border-top-right-radius:0;border-top-left-radius:0}.btn-group-justified{display:table;width:100%;table-layout:fixed;border-collapse:separate}.btn-group-justified>.btn,.btn-group-justified>.btn-group{float:none;display:table-cell;width:1%}.btn-group-justified>.btn-group .btn{width:100%}.btn-group-justified>.btn-group .dropdown-menu{left:auto}[data-toggle="buttons"]>.btn input[type="radio"],[data-toggle="buttons"]>.btn-group>.btn input[type="radio"],[data-toggle="buttons"]>.btn input[type="checkbox"],[data-toggle="buttons"]>.btn-group>.btn input[type="checkbox"]{position:absolute;clip:rect(0, 0, 0, 0);pointer-events:none}.input-group{position:relative;display:table;border-collapse:separate}.input-group[class*="col-"]{float:none;padding-left:0;padding-right:0}.input-group .form-control{position:relative;z-index:2;float:left;width:100%;margin-bottom:0}.input-group-lg>.form-control,.input-group-lg>.input-group-addon,.input-group-lg>.input-group-btn>.btn{height:54px;padding:14px 16px;font-size:18px;line-height:1.33;border-radius:6px}select.input-group-lg>.form-control,select.input-group-lg>.input-group-addon,select.input-group-lg>.input-group-btn>.btn{height:54px;line-height:54px}textarea.input-group-lg>.form-control,textarea.input-group-lg>.input-group-addon,textarea.input-group-lg>.input-group-btn>.btn,select[multiple].input-group-lg>.form-control,select[multiple].input-group-lg>.input-group-addon,select[multiple].input-group-lg>.input-group-btn>.btn{height:auto}.input-group-sm>.form-control,.input-group-sm>.input-group-addon,.input-group-sm>.input-group-btn>.btn{height:30px;padding:5px 10px;font-size:12px;line-height:1.5;border-radius:3px}select.input-group-sm>.form-control,select.input-group-sm>.input-group-addon,select.input-group-sm>.input-group-btn>.btn{height:30px;line-height:30px}textarea.input-group-sm>.form-control,textarea.input-group-sm>.input-group-addon,textarea.input-group-sm>.input-group-btn>.btn,select[multiple].input-group-sm>.form-control,select[multiple].input-group-sm>.input-group-addon,select[multiple].input-group-sm>.input-group-btn>.btn{height:auto}.input-group-addon,.input-group-btn,.input-group .form-control{display:table-cell}.input-group-addon:not(:first-child):not(:last-child),.input-group-btn:not(:first-child):not(:last-child),.input-group .form-control:not(:first-child):not(:last-child){border-radius:0}.input-group-addon,.input-group-btn{width:1%;white-space:nowrap;vertical-align:middle}.input-group-addon{padding:8px 12px;font-size:14px;font-weight:normal;line-height:1;color:#333333;text-align:center;background-color:#eeeeee;border:1px solid #cccccc;border-radius:4px}.input-group-addon.input-sm{padding:5px 10px;font-size:12px;border-radius:3px}.input-group-addon.input-lg{padding:14px 16px;font-size:18px;border-radius:6px}.input-group-addon input[type="radio"],.input-group-addon input[type="checkbox"]{margin-top:0}.input-group .form-control:first-child,.input-group-addon:first-child,.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group>.btn,.input-group-btn:first-child>.dropdown-toggle,.input-group-btn:last-child>.btn:not(:last-child):not(.dropdown-toggle),.input-group-btn:last-child>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-top-right-radius:0}.input-group-addon:first-child{border-right:0}.input-group .form-control:last-child,.input-group-addon:last-child,.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group>.btn,.input-group-btn:last-child>.dropdown-toggle,.input-group-btn:first-child>.btn:not(:first-child),.input-group-btn:first-child>.btn-group:not(:first-child)>.btn{border-bottom-left-radius:0;border-top-left-radius:0}.input-group-addon:last-child{border-left:0}.input-group-btn{position:relative;font-size:0;white-space:nowrap}.input-group-btn>.btn{position:relative}.input-group-btn>.btn+.btn{margin-left:-1px}.input-group-btn>.btn:hover,.input-group-btn>.btn:focus,.input-group-btn>.btn:active{z-index:2}.input-group-btn:first-child>.btn,.input-group-btn:first-child>.btn-group{margin-right:-1px}.input-group-btn:last-child>.btn,.input-group-btn:last-child>.btn-group{margin-left:-1px}.nav{margin-bottom:0;padding-left:0;list-style:none}.nav>li{position:relative;display:block}.nav>li>a{position:relative;display:block;padding:10px 15px}.nav>li>a:hover,.nav>li>a:focus{text-decoration:none;background-color:#eeeeee}.nav>li.disabled>a{color:#aea79f}.nav>li.disabled>a:hover,.nav>li.disabled>a:focus{color:#aea79f;text-decoration:none;background-color:transparent;cursor:not-allowed}.nav .open>a,.nav .open>a:hover,.nav .open>a:focus{background-color:#eeeeee;border-color:#dd4814}.nav .nav-divider{height:1px;margin:9px 0;overflow:hidden;background-color:#e5e5e5}.nav>li>a>img{max-width:none}.nav-tabs{border-bottom:1px solid #dddddd}.nav-tabs>li{float:left;margin-bottom:-1px}.nav-tabs>li>a{margin-right:2px;line-height:1.42857143;border:1px solid transparent;border-radius:4px 4px 0 0}.nav-tabs>li>a:hover{border-color:#eeeeee #eeeeee #dddddd}.nav-tabs>li.active>a,.nav-tabs>li.active>a:hover,.nav-tabs>li.active>a:focus{color:#777777;background-color:#ffffff;border:1px solid #dddddd;border-bottom-color:transparent;cursor:default}.nav-tabs.nav-justified{width:100%;border-bottom:0}.nav-tabs.nav-justified>li{float:none}.nav-tabs.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-tabs.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-tabs.nav-justified>li{display:table-cell;width:1%}.nav-tabs.nav-justified>li>a{margin-bottom:0}}.nav-tabs.nav-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs.nav-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs.nav-justified>.active>a,.nav-tabs.nav-justified>.active>a:hover,.nav-tabs.nav-justified>.active>a:focus{border-bottom-color:#ffffff}}.nav-pills>li{float:left}.nav-pills>li>a{border-radius:4px}.nav-pills>li+li{margin-left:2px}.nav-pills>li.active>a,.nav-pills>li.active>a:hover,.nav-pills>li.active>a:focus{color:#ffffff;background-color:#dd4814}.nav-stacked>li{float:none}.nav-stacked>li+li{margin-top:2px;margin-left:0}.nav-justified{width:100%}.nav-justified>li{float:none}.nav-justified>li>a{text-align:center;margin-bottom:5px}.nav-justified>.dropdown .dropdown-menu{top:auto;left:auto}@media (min-width:768px){.nav-justified>li{display:table-cell;width:1%}.nav-justified>li>a{margin-bottom:0}}.nav-tabs-justified{border-bottom:0}.nav-tabs-justified>li>a{margin-right:0;border-radius:4px}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border:1px solid #dddddd}@media (min-width:768px){.nav-tabs-justified>li>a{border-bottom:1px solid #dddddd;border-radius:4px 4px 0 0}.nav-tabs-justified>.active>a,.nav-tabs-justified>.active>a:hover,.nav-tabs-justified>.active>a:focus{border-bottom-color:#ffffff}}.tab-content>.tab-pane{display:none;visibility:hidden}.tab-content>.active{display:block;visibility:visible}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-right-radius:0;border-top-left-radius:0}.navbar{position:relative;min-height:50px;margin-bottom:20px;border:1px solid transparent}@media (min-width:768px){.navbar{border-radius:4px}}@media (min-width:768px){.navbar-header{float:left}}.navbar-collapse{overflow-x:visible;padding-right:15px;padding-left:15px;border-top:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1);-webkit-overflow-scrolling:touch}.navbar-collapse.in{overflow-y:auto}@media (min-width:768px){.navbar-collapse{width:auto;border-top:0;-webkit-box-shadow:none;box-shadow:none}.navbar-collapse.collapse{display:block !important;visibility:visible !important;height:auto !important;padding-bottom:0;overflow:visible !important}.navbar-collapse.in{overflow-y:visible}.navbar-fixed-top .navbar-collapse,.navbar-static-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{padding-left:0;padding-right:0}}.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:340px}@media (max-device-width:480px) and (orientation:landscape){.navbar-fixed-top .navbar-collapse,.navbar-fixed-bottom .navbar-collapse{max-height:200px}}.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:-15px;margin-left:-15px}@media (min-width:768px){.container>.navbar-header,.container-fluid>.navbar-header,.container>.navbar-collapse,.container-fluid>.navbar-collapse{margin-right:0;margin-left:0}}.navbar-static-top{z-index:1000;border-width:0 0 1px}@media (min-width:768px){.navbar-static-top{border-radius:0}}.navbar-fixed-top,.navbar-fixed-bottom{position:fixed;right:0;left:0;z-index:1030}@media (min-width:768px){.navbar-fixed-top,.navbar-fixed-bottom{border-radius:0}}.navbar-fixed-top{top:0;border-width:0 0 1px}.navbar-fixed-bottom{bottom:0;margin-bottom:0;border-width:1px 0 0}.navbar-brand{float:left;padding:15px 15px;font-size:18px;line-height:20px;height:50px}.navbar-brand:hover,.navbar-brand:focus{text-decoration:none}.navbar-brand>img{display:block}@media (min-width:768px){.navbar>.container .navbar-brand,.navbar>.container-fluid .navbar-brand{margin-left:-15px}}.navbar-toggle{position:relative;float:right;margin-right:15px;padding:9px 10px;margin-top:8px;margin-bottom:8px;background-color:transparent;background-image:none;border:1px solid transparent;border-radius:4px}.navbar-toggle:focus{outline:0}.navbar-toggle .icon-bar{display:block;width:22px;height:2px;border-radius:1px}.navbar-toggle .icon-bar+.icon-bar{margin-top:4px}@media (min-width:768px){.navbar-toggle{display:none}}.navbar-nav{margin:7.5px -15px}.navbar-nav>li>a{padding-top:10px;padding-bottom:10px;line-height:20px}@media (max-width:767px){.navbar-nav .open .dropdown-menu{position:static;float:none;width:auto;margin-top:0;background-color:transparent;border:0;-webkit-box-shadow:none;box-shadow:none}.navbar-nav .open .dropdown-menu>li>a,.navbar-nav .open .dropdown-menu .dropdown-header{padding:5px 15px 5px 25px}.navbar-nav .open .dropdown-menu>li>a{line-height:20px}.navbar-nav .open .dropdown-menu>li>a:hover,.navbar-nav .open .dropdown-menu>li>a:focus{background-image:none}}@media (min-width:768px){.navbar-nav{float:left;margin:0}.navbar-nav>li{float:left}.navbar-nav>li>a{padding-top:15px;padding-bottom:15px}}.navbar-form{margin-left:-15px;margin-right:-15px;padding:10px 15px;border-top:1px solid transparent;border-bottom:1px solid transparent;-webkit-box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);box-shadow:inset 0 1px 0 rgba(255,255,255,0.1),0 1px 0 rgba(255,255,255,0.1);margin-top:6px;margin-bottom:6px}@media (min-width:768px){.navbar-form .form-group{display:inline-block;margin-bottom:0;vertical-align:middle}.navbar-form .form-control{display:inline-block;width:auto;vertical-align:middle}.navbar-form .form-control-static{display:inline-block}.navbar-form .input-group{display:inline-table;vertical-align:middle}.navbar-form .input-group .input-group-addon,.navbar-form .input-group .input-group-btn,.navbar-form .input-group .form-control{width:auto}.navbar-form .input-group>.form-control{width:100%}.navbar-form .control-label{margin-bottom:0;vertical-align:middle}.navbar-form .radio,.navbar-form .checkbox{display:inline-block;margin-top:0;margin-bottom:0;vertical-align:middle}.navbar-form .radio label,.navbar-form .checkbox label{padding-left:0}.navbar-form .radio input[type="radio"],.navbar-form .checkbox input[type="checkbox"]{position:relative;margin-left:0}.navbar-form .has-feedback .form-control-feedback{top:0}}@media (max-width:767px){.navbar-form .form-group{margin-bottom:5px}.navbar-form .form-group:last-child{margin-bottom:0}}@media (min-width:768px){.navbar-form{width:auto;border:0;margin-left:0;margin-right:0;padding-top:0;padding-bottom:0;-webkit-box-shadow:none;box-shadow:none}}.navbar-nav>li>.dropdown-menu{margin-top:0;border-top-right-radius:0;border-top-left-radius:0}.navbar-fixed-bottom .navbar-nav>li>.dropdown-menu{border-top-right-radius:4px;border-top-left-radius:4px;border-bottom-right-radius:0;border-bottom-left-radius:0}.navbar-btn{margin-top:6px;margin-bottom:6px}.navbar-btn.btn-sm{margin-top:10px;margin-bottom:10px}.navbar-btn.btn-xs{margin-top:14px;margin-bottom:14px}.navbar-text{margin-top:15px;margin-bottom:15px}@media (min-width:768px){.navbar-text{float:left;margin-left:15px;margin-right:15px}}@media (min-width:768px){.navbar-left{float:left !important}.navbar-right{float:right !important;margin-right:-15px}.navbar-right~.navbar-right{margin-right:0}}.navbar-default{background-color:#dd4814;border-color:#bf3e11}.navbar-default .navbar-brand{color:#ffffff}.navbar-default .navbar-brand:hover,.navbar-default .navbar-brand:focus{color:#ffffff;background-color:none}.navbar-default .navbar-text{color:#ffffff}.navbar-default .navbar-nav>li>a{color:#ffffff}.navbar-default .navbar-nav>li>a:hover,.navbar-default .navbar-nav>li>a:focus{color:#ffffff;background-color:#97310e}.navbar-default .navbar-nav>.active>a,.navbar-default .navbar-nav>.active>a:hover,.navbar-default .navbar-nav>.active>a:focus{color:#ffffff;background-color:#ae3910}.navbar-default .navbar-nav>.disabled>a,.navbar-default .navbar-nav>.disabled>a:hover,.navbar-default .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-default .navbar-toggle{border-color:#97310e}.navbar-default .navbar-toggle:hover,.navbar-default .navbar-toggle:focus{background-color:#97310e}.navbar-default .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-default .navbar-collapse,.navbar-default .navbar-form{border-color:#bf3e11}.navbar-default .navbar-nav>.open>a,.navbar-default .navbar-nav>.open>a:hover,.navbar-default .navbar-nav>.open>a:focus{background-color:#ae3910;color:#ffffff}@media (max-width:767px){.navbar-default .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-default .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>li>a:focus{color:#ffffff;background-color:#97310e}.navbar-default .navbar-nav .open .dropdown-menu>.active>a,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#ae3910}.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-default .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-default .navbar-link{color:#ffffff}.navbar-default .navbar-link:hover{color:#ffffff}.navbar-default .btn-link{color:#ffffff}.navbar-default .btn-link:hover,.navbar-default .btn-link:focus{color:#ffffff}.navbar-default .btn-link[disabled]:hover,fieldset[disabled] .navbar-default .btn-link:hover,.navbar-default .btn-link[disabled]:focus,fieldset[disabled] .navbar-default .btn-link:focus{color:#cccccc}.navbar-inverse{background-color:#772953;border-color:#511c39}.navbar-inverse .navbar-brand{color:#ffffff}.navbar-inverse .navbar-brand:hover,.navbar-inverse .navbar-brand:focus{color:#ffffff;background-color:none}.navbar-inverse .navbar-text{color:#ffffff}.navbar-inverse .navbar-nav>li>a{color:#ffffff}.navbar-inverse .navbar-nav>li>a:hover,.navbar-inverse .navbar-nav>li>a:focus{color:#ffffff;background-color:#3e152b}.navbar-inverse .navbar-nav>.active>a,.navbar-inverse .navbar-nav>.active>a:hover,.navbar-inverse .navbar-nav>.active>a:focus{color:#ffffff;background-color:#511c39}.navbar-inverse .navbar-nav>.disabled>a,.navbar-inverse .navbar-nav>.disabled>a:hover,.navbar-inverse .navbar-nav>.disabled>a:focus{color:#cccccc;background-color:transparent}.navbar-inverse .navbar-toggle{border-color:#3e152b}.navbar-inverse .navbar-toggle:hover,.navbar-inverse .navbar-toggle:focus{background-color:#3e152b}.navbar-inverse .navbar-toggle .icon-bar{background-color:#ffffff}.navbar-inverse .navbar-collapse,.navbar-inverse .navbar-form{border-color:#5c2040}.navbar-inverse .navbar-nav>.open>a,.navbar-inverse .navbar-nav>.open>a:hover,.navbar-inverse .navbar-nav>.open>a:focus{background-color:#511c39;color:#ffffff}@media (max-width:767px){.navbar-inverse .navbar-nav .open .dropdown-menu>.dropdown-header{border-color:#511c39}.navbar-inverse .navbar-nav .open .dropdown-menu .divider{background-color:#511c39}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a{color:#ffffff}.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>li>a:focus{color:#ffffff;background-color:#3e152b}.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.active>a:focus{color:#ffffff;background-color:#511c39}.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:hover,.navbar-inverse .navbar-nav .open .dropdown-menu>.disabled>a:focus{color:#cccccc;background-color:transparent}}.navbar-inverse .navbar-link{color:#ffffff}.navbar-inverse .navbar-link:hover{color:#ffffff}.navbar-inverse .btn-link{color:#ffffff}.navbar-inverse .btn-link:hover,.navbar-inverse .btn-link:focus{color:#ffffff}.navbar-inverse .btn-link[disabled]:hover,fieldset[disabled] .navbar-inverse .btn-link:hover,.navbar-inverse .btn-link[disabled]:focus,fieldset[disabled] .navbar-inverse .btn-link:focus{color:#cccccc}.breadcrumb{padding:8px 15px;margin-bottom:20px;list-style:none;background-color:#f5f5f5;border-radius:4px}.breadcrumb>li{display:inline-block}.breadcrumb>li+li:before{content:"/\00a0";padding:0 5px;color:#cccccc}.breadcrumb>.active{color:#aea79f}.pagination{display:inline-block;padding-left:0;margin:20px 0;border-radius:4px}.pagination>li{display:inline}.pagination>li>a,.pagination>li>span{position:relative;float:left;padding:8px 12px;line-height:1.42857143;text-decoration:none;color:#dd4814;background-color:#ffffff;border:1px solid #dddddd;margin-left:-1px}.pagination>li:first-child>a,.pagination>li:first-child>span{margin-left:0;border-bottom-left-radius:4px;border-top-left-radius:4px}.pagination>li:last-child>a,.pagination>li:last-child>span{border-bottom-right-radius:4px;border-top-right-radius:4px}.pagination>li>a:hover,.pagination>li>span:hover,.pagination>li>a:focus,.pagination>li>span:focus{color:#97310e;background-color:#eeeeee;border-color:#dddddd}.pagination>.active>a,.pagination>.active>span,.pagination>.active>a:hover,.pagination>.active>span:hover,.pagination>.active>a:focus,.pagination>.active>span:focus{z-index:2;color:#aea79f;background-color:#f5f5f5;border-color:#dddddd;cursor:default}.pagination>.disabled>span,.pagination>.disabled>span:hover,.pagination>.disabled>span:focus,.pagination>.disabled>a,.pagination>.disabled>a:hover,.pagination>.disabled>a:focus{color:#aea79f;background-color:#ffffff;border-color:#dddddd;cursor:not-allowed}.pagination-lg>li>a,.pagination-lg>li>span{padding:14px 16px;font-size:18px}.pagination-lg>li:first-child>a,.pagination-lg>li:first-child>span{border-bottom-left-radius:6px;border-top-left-radius:6px}.pagination-lg>li:last-child>a,.pagination-lg>li:last-child>span{border-bottom-right-radius:6px;border-top-right-radius:6px}.pagination-sm>li>a,.pagination-sm>li>span{padding:5px 10px;font-size:12px}.pagination-sm>li:first-child>a,.pagination-sm>li:first-child>span{border-bottom-left-radius:3px;border-top-left-radius:3px}.pagination-sm>li:last-child>a,.pagination-sm>li:last-child>span{border-bottom-right-radius:3px;border-top-right-radius:3px}.pager{padding-left:0;margin:20px 0;list-style:none;text-align:center}.pager li{display:inline}.pager li>a,.pager li>span{display:inline-block;padding:5px 14px;background-color:#ffffff;border:1px solid #dddddd;border-radius:15px}.pager li>a:hover,.pager li>a:focus{text-decoration:none;background-color:#eeeeee}.pager .next>a,.pager .next>span{float:right}.pager .previous>a,.pager .previous>span{float:left}.pager .disabled>a,.pager .disabled>a:hover,.pager .disabled>a:focus,.pager .disabled>span{color:#aea79f;background-color:#ffffff;cursor:not-allowed}.label{display:inline;padding:.2em .6em .3em;font-size:75%;font-weight:bold;line-height:1;color:#ffffff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25em}a.label:hover,a.label:focus{color:#ffffff;text-decoration:none;cursor:pointer}.label:empty{display:none}.btn .label{position:relative;top:-1px}.label-default{background-color:#aea79f}.label-default[href]:hover,.label-default[href]:focus{background-color:#978e83}.label-primary{background-color:#dd4814}.label-primary[href]:hover,.label-primary[href]:focus{background-color:#ae3910}.label-success{background-color:#38b44a}.label-success[href]:hover,.label-success[href]:focus{background-color:#2c8d3a}.label-info{background-color:#772953}.label-info[href]:hover,.label-info[href]:focus{background-color:#511c39}.label-warning{background-color:#efb73e}.label-warning[href]:hover,.label-warning[href]:focus{background-color:#e7a413}.label-danger{background-color:#df382c}.label-danger[href]:hover,.label-danger[href]:focus{background-color:#bc271c}.badge{display:inline-block;min-width:10px;padding:3px 7px;font-size:12px;font-weight:bold;color:#ffffff;line-height:1;vertical-align:baseline;white-space:nowrap;text-align:center;background-color:#aea79f;border-radius:10px}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.btn-xs .badge{top:0;padding:1px 5px}a.badge:hover,a.badge:focus{color:#ffffff;text-decoration:none;cursor:pointer}.list-group-item.active>.badge,.nav-pills>.active>a>.badge{color:#dd4814;background-color:#ffffff}.list-group-item>.badge{float:right}.list-group-item>.badge+.badge{margin-right:5px}.nav-pills>li>a>.badge{margin-left:3px}.jumbotron{padding:30px 15px;margin-bottom:30px;color:inherit;background-color:#eeeeee}.jumbotron h1,.jumbotron .h1{color:inherit}.jumbotron p{margin-bottom:15px;font-size:21px;font-weight:200}.jumbotron>hr{border-top-color:#d5d5d5}.container .jumbotron,.container-fluid .jumbotron{border-radius:6px}.jumbotron .container{max-width:100%}@media screen and (min-width:768px){.jumbotron{padding:48px 0}.container .jumbotron,.container-fluid .jumbotron{padding-left:60px;padding-right:60px}.jumbotron h1,.jumbotron .h1{font-size:63px}}.thumbnail{display:block;padding:4px;margin-bottom:20px;line-height:1.42857143;background-color:#ffffff;border:1px solid #dddddd;border-radius:4px;-webkit-transition:border .2s ease-in-out;-o-transition:border .2s ease-in-out;transition:border .2s ease-in-out}.thumbnail>img,.thumbnail a>img{margin-left:auto;margin-right:auto}a.thumbnail:hover,a.thumbnail:focus,a.thumbnail.active{border-color:#dd4814}.thumbnail .caption{padding:9px;color:#333333}.alert{padding:15px;margin-bottom:20px;border:1px solid transparent;border-radius:4px}.alert h4{margin-top:0;color:inherit}.alert .alert-link{font-weight:bold}.alert>p,.alert>ul{margin-bottom:0}.alert>p+p{margin-top:5px}.alert-dismissable,.alert-dismissible{padding-right:35px}.alert-dismissable .close,.alert-dismissible .close{position:relative;top:-2px;right:-21px;color:inherit}.alert-success{background-color:#dff0d8;border-color:#d6e9c6;color:#468847}.alert-success hr{border-top-color:#c9e2b3}.alert-success .alert-link{color:#356635}.alert-info{background-color:#d9edf7;border-color:#bce8f1;color:#3a87ad}.alert-info hr{border-top-color:#a6e1ec}.alert-info .alert-link{color:#2d6987}.alert-warning{background-color:#fcf8e3;border-color:#fbeed5;color:#c09853}.alert-warning hr{border-top-color:#f8e5be}.alert-warning .alert-link{color:#a47e3c}.alert-danger{background-color:#f2dede;border-color:#eed3d7;color:#b94a48}.alert-danger hr{border-top-color:#e6c1c7}.alert-danger .alert-link{color:#953b39}@-webkit-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@-o-keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}@keyframes progress-bar-stripes{from{background-position:40px 0}to{background-position:0 0}}.progress{overflow:hidden;height:20px;margin-bottom:20px;background-color:#f5f5f5;border-radius:4px;-webkit-box-shadow:inset 0 1px 2px rgba(0,0,0,0.1);box-shadow:inset 0 1px 2px rgba(0,0,0,0.1)}.progress-bar{float:left;width:0%;height:100%;font-size:12px;line-height:20px;color:#ffffff;text-align:center;background-color:#dd4814;-webkit-box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);box-shadow:inset 0 -1px 0 rgba(0,0,0,0.15);-webkit-transition:width 0.6s ease;-o-transition:width 0.6s ease;transition:width 0.6s ease}.progress-striped .progress-bar,.progress-bar-striped{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);-webkit-background-size:40px 40px;background-size:40px 40px}.progress.active .progress-bar,.progress-bar.active{-webkit-animation:progress-bar-stripes 2s linear infinite;-o-animation:progress-bar-stripes 2s linear infinite;animation:progress-bar-stripes 2s linear infinite}.progress-bar-success{background-color:#38b44a}.progress-striped .progress-bar-success{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-info{background-color:#772953}.progress-striped .progress-bar-info{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-warning{background-color:#efb73e}.progress-striped .progress-bar-warning{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.progress-bar-danger{background-color:#df382c}.progress-striped .progress-bar-danger{background-image:-webkit-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:-o-linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent);background-image:linear-gradient(45deg, rgba(255,255,255,0.15) 25%, transparent 25%, transparent 50%, rgba(255,255,255,0.15) 50%, rgba(255,255,255,0.15) 75%, transparent 75%, transparent)}.media{margin-top:15px}.media:first-child{margin-top:0}.media-right,.media>.pull-right{padding-left:10px}.media-left,.media>.pull-left{padding-right:10px}.media-left,.media-right,.media-body{display:table-cell;vertical-align:top}.media-middle{vertical-align:middle}.media-bottom{vertical-align:bottom}.media-heading{margin-top:0;margin-bottom:5px}.media-list{padding-left:0;list-style:none}.list-group{margin-bottom:20px;padding-left:0}.list-group-item{position:relative;display:block;padding:10px 15px;margin-bottom:-1px;background-color:#ffffff;border:1px solid #dddddd}.list-group-item:first-child{border-top-right-radius:4px;border-top-left-radius:4px}.list-group-item:last-child{margin-bottom:0;border-bottom-right-radius:4px;border-bottom-left-radius:4px}a.list-group-item{color:#555555}a.list-group-item .list-group-item-heading{color:#333333}a.list-group-item:hover,a.list-group-item:focus{text-decoration:none;color:#555555;background-color:#f5f5f5}.list-group-item.disabled,.list-group-item.disabled:hover,.list-group-item.disabled:focus{background-color:#eeeeee;color:#aea79f;cursor:not-allowed}.list-group-item.disabled .list-group-item-heading,.list-group-item.disabled:hover .list-group-item-heading,.list-group-item.disabled:focus .list-group-item-heading{color:inherit}.list-group-item.disabled .list-group-item-text,.list-group-item.disabled:hover .list-group-item-text,.list-group-item.disabled:focus .list-group-item-text{color:#aea79f}.list-group-item.active,.list-group-item.active:hover,.list-group-item.active:focus{z-index:2;color:#ffffff;background-color:#dd4814;border-color:#dd4814}.list-group-item.active .list-group-item-heading,.list-group-item.active:hover .list-group-item-heading,.list-group-item.active:focus .list-group-item-heading,.list-group-item.active .list-group-item-heading>small,.list-group-item.active:hover .list-group-item-heading>small,.list-group-item.active:focus .list-group-item-heading>small,.list-group-item.active .list-group-item-heading>.small,.list-group-item.active:hover .list-group-item-heading>.small,.list-group-item.active:focus .list-group-item-heading>.small{color:inherit}.list-group-item.active .list-group-item-text,.list-group-item.active:hover .list-group-item-text,.list-group-item.active:focus .list-group-item-text{color:#fad1c3}.list-group-item-success{color:#468847;background-color:#dff0d8}a.list-group-item-success{color:#468847}a.list-group-item-success .list-group-item-heading{color:inherit}a.list-group-item-success:hover,a.list-group-item-success:focus{color:#468847;background-color:#d0e9c6}a.list-group-item-success.active,a.list-group-item-success.active:hover,a.list-group-item-success.active:focus{color:#fff;background-color:#468847;border-color:#468847}.list-group-item-info{color:#3a87ad;background-color:#d9edf7}a.list-group-item-info{color:#3a87ad}a.list-group-item-info .list-group-item-heading{color:inherit}a.list-group-item-info:hover,a.list-group-item-info:focus{color:#3a87ad;background-color:#c4e3f3}a.list-group-item-info.active,a.list-group-item-info.active:hover,a.list-group-item-info.active:focus{color:#fff;background-color:#3a87ad;border-color:#3a87ad}.list-group-item-warning{color:#c09853;background-color:#fcf8e3}a.list-group-item-warning{color:#c09853}a.list-group-item-warning .list-group-item-heading{color:inherit}a.list-group-item-warning:hover,a.list-group-item-warning:focus{color:#c09853;background-color:#faf2cc}a.list-group-item-warning.active,a.list-group-item-warning.active:hover,a.list-group-item-warning.active:focus{color:#fff;background-color:#c09853;border-color:#c09853}.list-group-item-danger{color:#b94a48;background-color:#f2dede}a.list-group-item-danger{color:#b94a48}a.list-group-item-danger .list-group-item-heading{color:inherit}a.list-group-item-danger:hover,a.list-group-item-danger:focus{color:#b94a48;background-color:#ebcccc}a.list-group-item-danger.active,a.list-group-item-danger.active:hover,a.list-group-item-danger.active:focus{color:#fff;background-color:#b94a48;border-color:#b94a48}.list-group-item-heading{margin-top:0;margin-bottom:5px}.list-group-item-text{margin-bottom:0;line-height:1.3}.panel{margin-bottom:20px;background-color:#ffffff;border:1px solid transparent;border-radius:4px;-webkit-box-shadow:0 1px 1px rgba(0,0,0,0.05);box-shadow:0 1px 1px rgba(0,0,0,0.05)}.panel-body{padding:15px}.panel-heading{padding:10px 15px;border-bottom:1px solid transparent;border-top-right-radius:3px;border-top-left-radius:3px}.panel-heading>.dropdown .dropdown-toggle{color:inherit}.panel-title{margin-top:0;margin-bottom:0;font-size:16px;color:inherit}.panel-title>a{color:inherit}.panel-footer{padding:10px 15px;background-color:#f5f5f5;border-top:1px solid #dddddd;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.list-group,.panel>.panel-collapse>.list-group{margin-bottom:0}.panel>.list-group .list-group-item,.panel>.panel-collapse>.list-group .list-group-item{border-width:1px 0;border-radius:0}.panel>.list-group:first-child .list-group-item:first-child,.panel>.panel-collapse>.list-group:first-child .list-group-item:first-child{border-top:0;border-top-right-radius:3px;border-top-left-radius:3px}.panel>.list-group:last-child .list-group-item:last-child,.panel>.panel-collapse>.list-group:last-child .list-group-item:last-child{border-bottom:0;border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel-heading+.list-group .list-group-item:first-child{border-top-width:0}.list-group+.panel-footer{border-top-width:0}.panel>.table,.panel>.table-responsive>.table,.panel>.panel-collapse>.table{margin-bottom:0}.panel>.table caption,.panel>.table-responsive>.table caption,.panel>.panel-collapse>.table caption{padding-left:15px;padding-right:15px}.panel>.table:first-child,.panel>.table-responsive:first-child>.table:first-child{border-top-right-radius:3px;border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child{border-top-left-radius:3px;border-top-right-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:first-child,.panel>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:first-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:first-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:first-child{border-top-left-radius:3px}.panel>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child td:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child td:last-child,.panel>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>thead:first-child>tr:first-child th:last-child,.panel>.table:first-child>tbody:first-child>tr:first-child th:last-child,.panel>.table-responsive:first-child>.table:first-child>tbody:first-child>tr:first-child th:last-child{border-top-right-radius:3px}.panel>.table:last-child,.panel>.table-responsive:last-child>.table:last-child{border-bottom-right-radius:3px;border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child{border-bottom-left-radius:3px;border-bottom-right-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:first-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:first-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:first-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:first-child{border-bottom-left-radius:3px}.panel>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child td:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child td:last-child,.panel>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tbody:last-child>tr:last-child th:last-child,.panel>.table:last-child>tfoot:last-child>tr:last-child th:last-child,.panel>.table-responsive:last-child>.table:last-child>tfoot:last-child>tr:last-child th:last-child{border-bottom-right-radius:3px}.panel>.panel-body+.table,.panel>.panel-body+.table-responsive,.panel>.table+.panel-body,.panel>.table-responsive+.panel-body{border-top:1px solid #dddddd}.panel>.table>tbody:first-child>tr:first-child th,.panel>.table>tbody:first-child>tr:first-child td{border-top:0}.panel>.table-bordered,.panel>.table-responsive>.table-bordered{border:0}.panel>.table-bordered>thead>tr>th:first-child,.panel>.table-responsive>.table-bordered>thead>tr>th:first-child,.panel>.table-bordered>tbody>tr>th:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:first-child,.panel>.table-bordered>tfoot>tr>th:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:first-child,.panel>.table-bordered>thead>tr>td:first-child,.panel>.table-responsive>.table-bordered>thead>tr>td:first-child,.panel>.table-bordered>tbody>tr>td:first-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:first-child,.panel>.table-bordered>tfoot>tr>td:first-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:first-child{border-left:0}.panel>.table-bordered>thead>tr>th:last-child,.panel>.table-responsive>.table-bordered>thead>tr>th:last-child,.panel>.table-bordered>tbody>tr>th:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>th:last-child,.panel>.table-bordered>tfoot>tr>th:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>th:last-child,.panel>.table-bordered>thead>tr>td:last-child,.panel>.table-responsive>.table-bordered>thead>tr>td:last-child,.panel>.table-bordered>tbody>tr>td:last-child,.panel>.table-responsive>.table-bordered>tbody>tr>td:last-child,.panel>.table-bordered>tfoot>tr>td:last-child,.panel>.table-responsive>.table-bordered>tfoot>tr>td:last-child{border-right:0}.panel>.table-bordered>thead>tr:first-child>td,.panel>.table-responsive>.table-bordered>thead>tr:first-child>td,.panel>.table-bordered>tbody>tr:first-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>td,.panel>.table-bordered>thead>tr:first-child>th,.panel>.table-responsive>.table-bordered>thead>tr:first-child>th,.panel>.table-bordered>tbody>tr:first-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:first-child>th{border-bottom:0}.panel>.table-bordered>tbody>tr:last-child>td,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>td,.panel>.table-bordered>tfoot>tr:last-child>td,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>td,.panel>.table-bordered>tbody>tr:last-child>th,.panel>.table-responsive>.table-bordered>tbody>tr:last-child>th,.panel>.table-bordered>tfoot>tr:last-child>th,.panel>.table-responsive>.table-bordered>tfoot>tr:last-child>th{border-bottom:0}.panel>.table-responsive{border:0;margin-bottom:0}.panel-group{margin-bottom:20px}.panel-group .panel{margin-bottom:0;border-radius:4px}.panel-group .panel+.panel{margin-top:5px}.panel-group .panel-heading{border-bottom:0}.panel-group .panel-heading+.panel-collapse>.panel-body,.panel-group .panel-heading+.panel-collapse>.list-group{border-top:1px solid #dddddd}.panel-group .panel-footer{border-top:0}.panel-group .panel-footer+.panel-collapse .panel-body{border-bottom:1px solid #dddddd}.panel-default{border-color:#dddddd}.panel-default>.panel-heading{color:#333333;background-color:#f5f5f5;border-color:#dddddd}.panel-default>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dddddd}.panel-default>.panel-heading .badge{color:#f5f5f5;background-color:#333333}.panel-default>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dddddd}.panel-primary{border-color:#dd4814}.panel-primary>.panel-heading{color:#ffffff;background-color:#dd4814;border-color:#dd4814}.panel-primary>.panel-heading+.panel-collapse>.panel-body{border-top-color:#dd4814}.panel-primary>.panel-heading .badge{color:#dd4814;background-color:#ffffff}.panel-primary>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#dd4814}.panel-success{border-color:#d6e9c6}.panel-success>.panel-heading{color:#468847;background-color:#dff0d8;border-color:#d6e9c6}.panel-success>.panel-heading+.panel-collapse>.panel-body{border-top-color:#d6e9c6}.panel-success>.panel-heading .badge{color:#dff0d8;background-color:#468847}.panel-success>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#d6e9c6}.panel-info{border-color:#bce8f1}.panel-info>.panel-heading{color:#3a87ad;background-color:#d9edf7;border-color:#bce8f1}.panel-info>.panel-heading+.panel-collapse>.panel-body{border-top-color:#bce8f1}.panel-info>.panel-heading .badge{color:#d9edf7;background-color:#3a87ad}.panel-info>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#bce8f1}.panel-warning{border-color:#fbeed5}.panel-warning>.panel-heading{color:#c09853;background-color:#fcf8e3;border-color:#fbeed5}.panel-warning>.panel-heading+.panel-collapse>.panel-body{border-top-color:#fbeed5}.panel-warning>.panel-heading .badge{color:#fcf8e3;background-color:#c09853}.panel-warning>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#fbeed5}.panel-danger{border-color:#eed3d7}.panel-danger>.panel-heading{color:#b94a48;background-color:#f2dede;border-color:#eed3d7}.panel-danger>.panel-heading+.panel-collapse>.panel-body{border-top-color:#eed3d7}.panel-danger>.panel-heading .badge{color:#f2dede;background-color:#b94a48}.panel-danger>.panel-footer+.panel-collapse>.panel-body{border-bottom-color:#eed3d7}.embed-responsive{position:relative;display:block;height:0;padding:0;overflow:hidden}.embed-responsive .embed-responsive-item,.embed-responsive iframe,.embed-responsive embed,.embed-responsive object,.embed-responsive video{position:absolute;top:0;left:0;bottom:0;height:100%;width:100%;border:0}.embed-responsive.embed-responsive-16by9{padding-bottom:56.25%}.embed-responsive.embed-responsive-4by3{padding-bottom:75%}.well{min-height:20px;padding:19px;margin-bottom:20px;background-color:#f5f5f5;border:1px solid #e3e3e3;border-radius:4px;-webkit-box-shadow:inset 0 1px 1px rgba(0,0,0,0.05);box-shadow:inset 0 1px 1px rgba(0,0,0,0.05)}.well blockquote{border-color:#ddd;border-color:rgba(0,0,0,0.15)}.well-lg{padding:24px;border-radius:6px}.well-sm{padding:9px;border-radius:3px}.close{float:right;font-size:21px;font-weight:bold;line-height:1;color:#000000;text-shadow:0 1px 0 #ffffff;opacity:0.2;filter:alpha(opacity=20)}.close:hover,.close:focus{color:#000000;text-decoration:none;cursor:pointer;opacity:0.5;filter:alpha(opacity=50)}button.close{padding:0;cursor:pointer;background:transparent;border:0;-webkit-appearance:none}.modal-open{overflow:hidden}.modal{display:none;overflow:hidden;position:fixed;top:0;right:0;bottom:0;left:0;z-index:1040;-webkit-overflow-scrolling:touch;outline:0}.modal.fade .modal-dialog{-webkit-transform:translate(0, -25%);-ms-transform:translate(0, -25%);-o-transform:translate(0, -25%);transform:translate(0, -25%);-webkit-transition:-webkit-transform .3s ease-out;-o-transition:-o-transform .3s ease-out;transition:transform .3s ease-out}.modal.in .modal-dialog{-webkit-transform:translate(0, 0);-ms-transform:translate(0, 0);-o-transform:translate(0, 0);transform:translate(0, 0)}.modal-open .modal{overflow-x:hidden;overflow-y:auto}.modal-dialog{position:relative;width:auto;margin:10px}.modal-content{position:relative;background-color:#ffffff;border:1px solid #999999;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 3px 9px rgba(0,0,0,0.5);box-shadow:0 3px 9px rgba(0,0,0,0.5);-webkit-background-clip:padding-box;background-clip:padding-box;outline:0}.modal-backdrop{position:absolute;top:0;right:0;left:0;background-color:#000000}.modal-backdrop.fade{opacity:0;filter:alpha(opacity=0)}.modal-backdrop.in{opacity:0.5;filter:alpha(opacity=50)}.modal-header{padding:15px;border-bottom:1px solid #e5e5e5;min-height:16.42857143px}.modal-header .close{margin-top:-2px}.modal-title{margin:0;line-height:1.42857143}.modal-body{position:relative;padding:20px}.modal-footer{padding:20px;text-align:right;border-top:1px solid #e5e5e5}.modal-footer .btn+.btn{margin-left:5px;margin-bottom:0}.modal-footer .btn-group .btn+.btn{margin-left:-1px}.modal-footer .btn-block+.btn-block{margin-left:0}.modal-scrollbar-measure{position:absolute;top:-9999px;width:50px;height:50px;overflow:scroll}@media (min-width:768px){.modal-dialog{width:600px;margin:30px auto}.modal-content{-webkit-box-shadow:0 5px 15px rgba(0,0,0,0.5);box-shadow:0 5px 15px rgba(0,0,0,0.5)}.modal-sm{width:300px}}@media (min-width:992px){.modal-lg{width:900px}}.tooltip{position:absolute;z-index:1070;display:block;visibility:visible;font-family:"Ubuntu",Tahoma,"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:12px;font-weight:normal;line-height:1.4;opacity:0;filter:alpha(opacity=0)}.tooltip.in{opacity:0.9;filter:alpha(opacity=90)}.tooltip.top{margin-top:-3px;padding:5px 0}.tooltip.right{margin-left:3px;padding:0 5px}.tooltip.bottom{margin-top:3px;padding:5px 0}.tooltip.left{margin-left:-3px;padding:0 5px}.tooltip-inner{max-width:200px;padding:3px 8px;color:#ffffff;text-align:center;text-decoration:none;background-color:rgba(0,0,0,0.9);border-radius:4px}.tooltip-arrow{position:absolute;width:0;height:0;border-color:transparent;border-style:solid}.tooltip.top .tooltip-arrow{bottom:0;left:50%;margin-left:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-left .tooltip-arrow{bottom:0;right:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.top-right .tooltip-arrow{bottom:0;left:5px;margin-bottom:-5px;border-width:5px 5px 0;border-top-color:rgba(0,0,0,0.9)}.tooltip.right .tooltip-arrow{top:50%;left:0;margin-top:-5px;border-width:5px 5px 5px 0;border-right-color:rgba(0,0,0,0.9)}.tooltip.left .tooltip-arrow{top:50%;right:0;margin-top:-5px;border-width:5px 0 5px 5px;border-left-color:rgba(0,0,0,0.9)}.tooltip.bottom .tooltip-arrow{top:0;left:50%;margin-left:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-left .tooltip-arrow{top:0;right:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.tooltip.bottom-right .tooltip-arrow{top:0;left:5px;margin-top:-5px;border-width:0 5px 5px;border-bottom-color:rgba(0,0,0,0.9)}.popover{position:absolute;top:0;left:0;z-index:1060;display:none;max-width:276px;padding:1px;font-family:"Ubuntu",Tahoma,"Helvetica Neue",Helvetica,Arial,sans-serif;font-size:14px;font-weight:normal;line-height:1.42857143;text-align:left;background-color:#ffffff;-webkit-background-clip:padding-box;background-clip:padding-box;border:1px solid #cccccc;border:1px solid rgba(0,0,0,0.2);border-radius:6px;-webkit-box-shadow:0 5px 10px rgba(0,0,0,0.2);box-shadow:0 5px 10px rgba(0,0,0,0.2);white-space:normal}.popover.top{margin-top:-10px}.popover.right{margin-left:10px}.popover.bottom{margin-top:10px}.popover.left{margin-left:-10px}.popover-title{margin:0;padding:8px 14px;font-size:14px;background-color:#f7f7f7;border-bottom:1px solid #ebebeb;border-radius:5px 5px 0 0}.popover-content{padding:9px 14px}.popover>.arrow,.popover>.arrow:after{position:absolute;display:block;width:0;height:0;border-color:transparent;border-style:solid}.popover>.arrow{border-width:11px}.popover>.arrow:after{border-width:10px;content:""}.popover.top>.arrow{left:50%;margin-left:-11px;border-bottom-width:0;border-top-color:#999999;border-top-color:rgba(0,0,0,0.25);bottom:-11px}.popover.top>.arrow:after{content:" ";bottom:1px;margin-left:-10px;border-bottom-width:0;border-top-color:#ffffff}.popover.right>.arrow{top:50%;left:-11px;margin-top:-11px;border-left-width:0;border-right-color:#999999;border-right-color:rgba(0,0,0,0.25)}.popover.right>.arrow:after{content:" ";left:1px;bottom:-10px;border-left-width:0;border-right-color:#ffffff}.popover.bottom>.arrow{left:50%;margin-left:-11px;border-top-width:0;border-bottom-color:#999999;border-bottom-color:rgba(0,0,0,0.25);top:-11px}.popover.bottom>.arrow:after{content:" ";top:1px;margin-left:-10px;border-top-width:0;border-bottom-color:#ffffff}.popover.left>.arrow{top:50%;right:-11px;margin-top:-11px;border-right-width:0;border-left-color:#999999;border-left-color:rgba(0,0,0,0.25)}.popover.left>.arrow:after{content:" ";right:1px;border-right-width:0;border-left-color:#ffffff;bottom:-10px}.carousel{position:relative}.carousel-inner{position:relative;overflow:hidden;width:100%}.carousel-inner>.item{display:none;position:relative;-webkit-transition:.6s ease-in-out left;-o-transition:.6s ease-in-out left;transition:.6s ease-in-out left}.carousel-inner>.item>img,.carousel-inner>.item>a>img{line-height:1}@media all and (transform-3d),(-webkit-transform-3d){.carousel-inner>.item{-webkit-transition:-webkit-transform .6s ease-in-out;-o-transition:-o-transform .6s ease-in-out;transition:transform .6s ease-in-out;-webkit-backface-visibility:hidden;backface-visibility:hidden;-webkit-perspective:1000;perspective:1000}.carousel-inner>.item.next,.carousel-inner>.item.active.right{-webkit-transform:translate3d(100%, 0, 0);transform:translate3d(100%, 0, 0);left:0}.carousel-inner>.item.prev,.carousel-inner>.item.active.left{-webkit-transform:translate3d(-100%, 0, 0);transform:translate3d(-100%, 0, 0);left:0}.carousel-inner>.item.next.left,.carousel-inner>.item.prev.right,.carousel-inner>.item.active{-webkit-transform:translate3d(0, 0, 0);transform:translate3d(0, 0, 0);left:0}}.carousel-inner>.active,.carousel-inner>.next,.carousel-inner>.prev{display:block}.carousel-inner>.active{left:0}.carousel-inner>.next,.carousel-inner>.prev{position:absolute;top:0;width:100%}.carousel-inner>.next{left:100%}.carousel-inner>.prev{left:-100%}.carousel-inner>.next.left,.carousel-inner>.prev.right{left:0}.carousel-inner>.active.left{left:-100%}.carousel-inner>.active.right{left:100%}.carousel-control{position:absolute;top:0;left:0;bottom:0;width:15%;opacity:0.5;filter:alpha(opacity=50);font-size:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-control.left{background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.5)), to(rgba(0,0,0,0.0001)));background-image:linear-gradient(to right, rgba(0,0,0,0.5) 0, rgba(0,0,0,0.0001) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1)}.carousel-control.right{left:auto;right:0;background-image:-webkit-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-o-linear-gradient(left, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-image:-webkit-gradient(linear, left top, right top, from(rgba(0,0,0,0.0001)), to(rgba(0,0,0,0.5)));background-image:linear-gradient(to right, rgba(0,0,0,0.0001) 0, rgba(0,0,0,0.5) 100%);background-repeat:repeat-x;filter:progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1)}.carousel-control:hover,.carousel-control:focus{outline:0;color:#ffffff;text-decoration:none;opacity:0.9;filter:alpha(opacity=90)}.carousel-control .icon-prev,.carousel-control .icon-next,.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right{position:absolute;top:50%;z-index:5;display:inline-block}.carousel-control .icon-prev,.carousel-control .glyphicon-chevron-left{left:50%;margin-left:-10px}.carousel-control .icon-next,.carousel-control .glyphicon-chevron-right{right:50%;margin-right:-10px}.carousel-control .icon-prev,.carousel-control .icon-next{width:20px;height:20px;margin-top:-10px;font-family:serif}.carousel-control .icon-prev:before{content:'\2039'}.carousel-control .icon-next:before{content:'\203a'}.carousel-indicators{position:absolute;bottom:10px;left:50%;z-index:15;width:60%;margin-left:-30%;padding-left:0;list-style:none;text-align:center}.carousel-indicators li{display:inline-block;width:10px;height:10px;margin:1px;text-indent:-999px;border:1px solid #ffffff;border-radius:10px;cursor:pointer;background-color:#000 \9;background-color:rgba(0,0,0,0)}.carousel-indicators .active{margin:0;width:12px;height:12px;background-color:#ffffff}.carousel-caption{position:absolute;left:15%;right:15%;bottom:20px;z-index:10;padding-top:20px;padding-bottom:20px;color:#ffffff;text-align:center;text-shadow:0 1px 2px rgba(0,0,0,0.6)}.carousel-caption .btn{text-shadow:none}@media screen and (min-width:768px){.carousel-control .glyphicon-chevron-left,.carousel-control .glyphicon-chevron-right,.carousel-control .icon-prev,.carousel-control .icon-next{width:30px;height:30px;margin-top:-15px;font-size:30px}.carousel-control .glyphicon-chevron-left,.carousel-control .icon-prev{margin-left:-15px}.carousel-control .glyphicon-chevron-right,.carousel-control .icon-next{margin-right:-15px}.carousel-caption{left:20%;right:20%;padding-bottom:30px}.carousel-indicators{bottom:20px}}.clearfix:before,.clearfix:after,.dl-horizontal dd:before,.dl-horizontal dd:after,.container:before,.container:after,.container-fluid:before,.container-fluid:after,.row:before,.row:after,.form-horizontal .form-group:before,.form-horizontal .form-group:after,.btn-toolbar:before,.btn-toolbar:after,.btn-group-vertical>.btn-group:before,.btn-group-vertical>.btn-group:after,.nav:before,.nav:after,.navbar:before,.navbar:after,.navbar-header:before,.navbar-header:after,.navbar-collapse:before,.navbar-collapse:after,.pager:before,.pager:after,.panel-body:before,.panel-body:after,.modal-footer:before,.modal-footer:after{content:" ";display:table}.clearfix:after,.dl-horizontal dd:after,.container:after,.container-fluid:after,.row:after,.form-horizontal .form-group:after,.btn-toolbar:after,.btn-group-vertical>.btn-group:after,.nav:after,.navbar:after,.navbar-header:after,.navbar-collapse:after,.pager:after,.panel-body:after,.modal-footer:after{clear:both}.center-block{display:block;margin-left:auto;margin-right:auto}.pull-right{float:right !important}.pull-left{float:left !important}.hide{display:none !important}.show{display:block !important}.invisible{visibility:hidden}.text-hide{font:0/0 a;color:transparent;text-shadow:none;background-color:transparent;border:0}.hidden{display:none !important;visibility:hidden !important}.affix{position:fixed}@-ms-viewport{width:device-width}.visible-xs,.visible-sm,.visible-md,.visible-lg{display:none !important}.visible-xs-block,.visible-xs-inline,.visible-xs-inline-block,.visible-sm-block,.visible-sm-inline,.visible-sm-inline-block,.visible-md-block,.visible-md-inline,.visible-md-inline-block,.visible-lg-block,.visible-lg-inline,.visible-lg-inline-block{display:none !important}@media (max-width:767px){.visible-xs{display:block !important}table.visible-xs{display:table}tr.visible-xs{display:table-row !important}th.visible-xs,td.visible-xs{display:table-cell !important}}@media (max-width:767px){.visible-xs-block{display:block !important}}@media (max-width:767px){.visible-xs-inline{display:inline !important}}@media (max-width:767px){.visible-xs-inline-block{display:inline-block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm{display:block !important}table.visible-sm{display:table}tr.visible-sm{display:table-row !important}th.visible-sm,td.visible-sm{display:table-cell !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-block{display:block !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline{display:inline !important}}@media (min-width:768px) and (max-width:991px){.visible-sm-inline-block{display:inline-block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md{display:block !important}table.visible-md{display:table}tr.visible-md{display:table-row !important}th.visible-md,td.visible-md{display:table-cell !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-block{display:block !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline{display:inline !important}}@media (min-width:992px) and (max-width:1199px){.visible-md-inline-block{display:inline-block !important}}@media (min-width:1200px){.visible-lg{display:block !important}table.visible-lg{display:table}tr.visible-lg{display:table-row !important}th.visible-lg,td.visible-lg{display:table-cell !important}}@media (min-width:1200px){.visible-lg-block{display:block !important}}@media (min-width:1200px){.visible-lg-inline{display:inline !important}}@media (min-width:1200px){.visible-lg-inline-block{display:inline-block !important}}@media (max-width:767px){.hidden-xs{display:none !important}}@media (min-width:768px) and (max-width:991px){.hidden-sm{display:none !important}}@media (min-width:992px) and (max-width:1199px){.hidden-md{display:none !important}}@media (min-width:1200px){.hidden-lg{display:none !important}}.visible-print{display:none !important}@media print{.visible-print{display:block !important}table.visible-print{display:table}tr.visible-print{display:table-row !important}th.visible-print,td.visible-print{display:table-cell !important}}.visible-print-block{display:none !important}@media print{.visible-print-block{display:block !important}}.visible-print-inline{display:none !important}@media print{.visible-print-inline{display:inline !important}}.visible-print-inline-block{display:none !important}@media print{.visible-print-inline-block{display:inline-block !important}}@media print{.hidden-print{display:none !important}}.navbar-default .badge{background-color:#fff;color:#dd4814}.navbar-inverse .badge{background-color:#fff;color:#772953} \ No newline at end of file diff --git a/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.eot b/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.eot deleted file mode 100644 index 4a4ca865d67e86f961bc6e2ef00bffa4e34bb9ed..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 20335 zcma%iRa9Lu*X_aGIXLtH2X}XOcXxM};>BGK?k>gMi@Uo+afec%&=$Y_zI(@iAMVRd zMzYtMnVHGh`(bBgBrYld0G2WU0R1n+0{)ZW{#ye8Pyh%N;2)-_`hS4`dHjR_o8s?3 z%Kr!aAA=Sk15gC$0aO9906BmJKn0)-&;Wq`d1e4dfc3v(2XF@106hNnKnJJ;tp3?v z|4=i4`#;17p#2YV|JP~t*4IuDO^FK=e+xx$$?LVd`z~aAr@Bit+ z4B+|46aYB=Q+D{L`5%t;Kdt|aZw_GpXL0?v@B%pgd3^uI=KcSkIq3hHHvk~6A@l#d zDHwovCxFWvz!d;sGQ^&}h@CLq(3!MVaFhSyL!rg*&d8F%X_&hML`QYBTiRZ}i=N8C zfX|m2SCm$2B^?XKJ=3POS}r1sVM9Nj*l5q`5#S% zQ}FD^zy1Pj*xUGOm4;*C;l80oktO?~%SdX8H^8@@idBFWyOINSr_!xo{REWRlXgw| z3-(h5XcHaEdPKzyy2-P+Rljn4lR?IelEOtWLiC?_9FW&x@kpuRtfsn*-QLS4EoN{{q0u8pt_^hD_!V);D{hen z-XpV~5QeQTYTIl1+B^5r72`!7FRQQ$Jh74=Gm*OkaIoNUC7!wk7rRZVuVK6urnp@}QDpB~9*S zkVWg8LyXz8-%53>GXb$%*H0(bqkUIN`Oz8g=bse?bAumC8`5XqA+(_y{fV^j(1$BZ za*@mJ(&?Dl2k;8tW}O6OaavJE|17u#1t>M^0!@SDJc2)cLZL`m7!-)74CQUXoksM* z9m|Sjh}@dm-Tnc8<77&TfjT6H{3)kXMM774`D!eA0|(RuQz@iQO(4-7lX|aK*M`Y=f%R{_&<*A? zB(AZUl6JXgz^9c9q7ZW~Lpncpv1I^6O4mGX@3P^Q)?jBgx(f#RD_4y0q5aC_beGG> zn%RbEy_vdx`sL?|Jvlgyxal-}XM^FDQYp|Euiu=%8o(=wic+XSimJ4(Adn3`QH6^D zQ}H@oBN{|Zg^2u|@8c~h7Kv&HCx??xy^J$3{B0{XnlrThDaoQqjXjXHi#b!KIjA7( z$hT;Ah_VP&j)(Z6&(xn;KF3rHsF^A#il?$)q4Pp#sly?|%OmoRG|MiNW3+)?3Wd9= zgbUjzTLX+!G&oYj9P;jnHmT91qKPzxkj@>rsqi|=M5$PfrRCY%E7${xLDZFtYcC%k zorpLj$T65dN+HV@=yRlKSS8W~SMxFkK1~U-XW2@DXcG`4-V)z|605uD4Q{MP10fD5 zc!T#)n57))zXXfg=dwnZuD_`DCJc3cHE6HuA(>36o_neqgoF0pRK0eEc~{rD8%Pfh z@dtE6ovkazKj3fd{)*&tB0YA^1d^^?2oeNyB7u(P+O4$@lCNc~%mb5iP)dLGM|z;x zEkRYM_^U`g%s5jiH=8Q2h zlS%BdC6DaYEWi0UNhnc*zFT$fV`4_VMNU~nH;q(Ld?!#lIvm)K;W_4C(l3+4TZ=QI zD%siB%cY+Y7vMFM_KAg?sxm(^nJsMIV?v|vAS8l;zotv$#Ml-Y!n7|X5Y5C)=TiGZ zQ+=(9%lk0&L&hDtwRD=Ua6wQeS{g2mvwc>^|4$ot-2Hi`z)|V$N{mNAEZC3gw_8%z zq(L3Bcwr2gin62dXM8cG-D-auD7HayLz zJI2|m=8$F?Ko>v@P4{(W5g=}-b$%tJgfywp`6&A96|Zx{9N;1@_>hto7TQf3EIMm+ zJ`;@@4ycXnHM>|iJ?FXkWGc8YuGviO&L*^ajd+vyLIxAAT{isADQQM5S;YP+jAYp7 z3E1Nm1HDd%SXi``NR*so7XidvRPj#BM7A`S{cU%VISQOhrMLr08;N36AYg9}40Ml# zU)GUxQy(D1%P`@`HDaXn&%m8`hOu~_2a`%P{v7w2;KUNhll)N(y4wD#p#{+($uLOB z!X;K=sci1erRm1=Qcx#ja(r=E8*89RNH8`C7T4|#uVRc=Kaf}0Xw)>8g0(4H!ZrK^ zh-Kf(V#NQcMU79on9bk?`U7eI{Nu-CdboLYH-7lJI|7VCob2872$p->3n)-J>N|b% zIn3vzKet~nvHB=bP6rDRV|&&4LL}S7`iu2ok&r8ecw~yUROul?44VSV3;z7qSQWl+y^cX=$j~OQ;o~0+_)5WDRF0^JbuD_umr4Mn$EPEyB-_eog^1*P#Ui}dCDH6-GndXgi$XV2SNHe#HHQoU z`2f{kT*~Y-Gtyd}I#v=*PbShJzp4hgaK>cr++;2GSGr7^2gA_3H1F;=06B{L4@fTs zD?F!vb_51Hnzb3BJlYiI4qZ5fDt|CaKX-N&2aP_DVX`bH*FN93cV*3fPvociz|dFF zDI@_;;4`*j9yW7pmnXjEwqe@BEQw*5Kcl$=zJxCo$}$5>0aU8*UXir zlo6vuHSn81M=rz-M|tYukSa7I2M$#Q-7`8&2-+UvW25@8gOf1VSR}3RdVFr|-&}4T zky0u`XuQc%0#b=LJWu5hm&cbB$Zk2FeYD~v-Cc92u|%sIUh-65dJR zZ3)g?oGWe-H6(Dl5E)k2)Hal?$9R73FM9`l`qB^<^f4kuce&|T)yCo{^=_a`TY*c$ zRRh_284jJjLoW$Wjv_@n$8LbXuW0pZw;g`-3$XUHD0Me!pbdD8z$3+L^KKYOabFdl zZW8&J8yRWfjLh?e7QJEkgl<&QwDnZ2^WwgBH0{AjxI^@Q)51nlGRVgj8j^jL0%{L5 zg~N&QybX0(ldaaot?}x4%vuVeTbZ96fpg*k(_p?a+IFGn!YUuS;~_Z0CLyGFeQ=ow zhS}^5R4dLfu9Q@MFw7c5_Tg`%mq$XF81YXSFD~rt=E6o|lVBQmHpMG(*<)M(E(4f* zifS(;Yjenr?~y*l>F20zQ%mciliU45f-wznJZdw(tS7t6>004*2#X3Ej3pco3fi`a z?|gM_ckVQxZ*D!nTeU+|gbdPEj(!rKUXu)| zkLqUGanZqn25Ek?PHa9%4W|%Ad_2AJ^C4ZsK(9AW?d?fe_y54j#ceCX7%ZMmS`{x=_0fcCjb0L>U_D>5f4kNy zHQQg5@4aYV)6gpTnv`z06M5a}w7=9Zxp`bcn&i(EOAPWj!?Z(2O?^DESnGfRDGcs1 z?IvJ*{LKonl7#robcFc@OJ<~_Nrt1&v@ePe#wEFKMxfTA!AwJm2~n9HG8Q3?YR-Yz z9Qm3kx|c48;)6Kyoo?<`!|@@xwp~u#ofuQm>ip4bLvO_8W)9{2phqI7{WR9NLgJ5S zHO8hXtJ(CY)mUG&o(gGo!3Qk!=#XUS13O&o{vweBJ4o1y<~#&5^$s69ECV9xM}=+2 z3!NJW8%Q`f_Ja)nexErX5!VB@V=TLVghSEjRt5vdJ8zuRg0R+Y>(Wb*7ED)es#R7< zyyj>az=m}1XQ+E7Z@KG=Cs|{!+EejQ_B-7_Z_Y;kETxVVJOayFzr&scDu#RzsdT7?ZD( zjt$GiPqMQDN##jNA(UuHMgjopqE;pkUTep+3YhG2G!BnK?~X#v(Hh{G+w3pu5aBF+5$)Hq);#9CbG zsE7UhKwvg;w*V(0K7kvgnm5CXt2oMK#y!&dqW6^CO`o-9h;rpe8sX@M7vdNHrSI)y z9KlvS+@+-`CzlS3h}P)VbJn)MN&1rZJDgsR=F2FHZMpd&S1VRKi;7W;=|X`v`iwr; z6={w%x(Bj(^(a<%?7PB*S%}>sft}U!!qdscsQgT@3X5WihmLBxuS7?1$@SvvJ3<<| zt}Y%yqH_W&6!_(na-jr#Zv7W*Cu#c6Hqr$o{eMTHmIWfcuI+rsXc1x$ibc)|lxs`| z^lhQp&^b^BTL(xEI!6k8bxom-D8C}+6_a%`?CYjSuFcEh5J1&Y`Z-6Dj-I`%()n$9 zg*b<&Zs^xdC{p2ab~}fxiuobr7XT7pIefDq+B0S-e*#Ncv}xLJi{{yPWu)?Esyu0; z1qsK_FAEg-C+$p0cp*xgs1s4btkM&3lqqeQRpD2eomd(OP0Q@*e&Xas38amh5^boC zOw$(pnvN$4MdoQ_u*a%EGU#34!L8h;hCq2qu>vma`dr@6OJ$uR*Uy0|v+9(q#{vUE z-6#WJn9K=D1b|=3z9t2tlyis<332BeH7r+zY@~b=^WA5yuvSMiyU=H97SQ7PJ=xDq8^5h@!5s)7NwIC(^9c}UqFKh>XnFPu|+L@P;S z3sSA!`G>+GcF}A^nfl|n_2P=oi#0>A$BphJo^niV$39q>jBn7=yG3jodFC|0-)C$R z@AvsPawzRcdI+N@#+XCUhE-bV6R(fb0#L8<{kZo-bBF0d_eb2=Oq%CRy|M%BGBmTi z*(vF=mDqfB)Ffbr1WObL5rtaXXn7h$vMIMyd!!E!)5Fe{yHa{ZKHpGwQ9J-@cQ$OX z8Bux&6WJ%|zF+jJZ&(g-&u~QV-Y_~q?DJ>#3~9WiBeIU_uh)eb{b{VUn_K9kFfYXL z#W?5L8z;XrA?Kc&ua35Hi_uhWghl9)h*)J}%wG+Xnnp2ZOl*YtK3VQxUMfBM+z>E2 zeI`!tBDijjXYxlLEZu7t_T<~!mR0{o>6W*Ejr z6v8z^G$W!dDq*^y$WbyhI)x}-s>tdk0{-;A z91U?k6Rg*%T*U)Uv_PP_}4jhJ6|~ z)$B}m4(d`YtCBcrVbz?cQGo|NhMK(@OnGsU7OAKgUBJLh?E@OO@sfUG8M``oQbcDgDKEy^t6!AhE@HqgSG<3Q{ND7tH!G1 zQFCZgl=Ykxr~0pdq)`n2y3~Y0cvkO5i!CLTAc68-9cOMi2c29BTcg!W5=XzHR68tT zH%o4w$B?>YF0Aq0w*Q@DIf|UyjajcxO2`!Av{p;s2#z_Xfp*{$2fM>65~br|rCyhX zcrN@r4!w~3imlj-eew7qq8d&vtYnSAT9&|&Y&=~}zF5=-5at@Gr1s6~`eBk{nJh+@ z#(=xEI>c6xXU(ucS*a_!ww@WYvo?~@3dBjqAUH~h9mW5q!R#);8l%8+oJnb+-ydqv)LHQJSgY=p%{@~Fk(V6=o{<5fV>)fPWOyXSo|G?G=*~> z?z><)(Ss@lE|vU-2vhORxCM>@LEx4O{!kmzI5 zFUOuOX^BHASj%#FATqS(FnqPTp^|Sq;eg3wKvIzUJ%FNpoCY`^OPv(^>&j{V#RFzE z@3Y)bA(4m_iaS`J&gG(v^)Jth;W$iESCeCBA1#B(N63V{dggoJ%RQn}c>a@^%gazJ zI$Shg5yVpcpnJOOWY^dBUI=3iC>#a1p2NQs|b zgZHukR9HwV8Sgp{#+jN7ZB3DI6~hIHv@&% z=$?K2gzM;xC?K<9N0|-BMSk4bLI)uB*!ugfY0qP3R%y5O?&{Xfzojfbw?zj^P+_;e zRVm>&GsN)=HBH+0BHxJo&ckuL8w0=_w~q6R{ghxeMmsDh;9@n%VFE`Zx%pQglC=A4 zmJFxIgNwqP)8^b#RwBGP+eI;wi}{^pYMTtQ4h21k5DL#G?TZ4VCjrqHlXx z5GWyy1)M+9Im*H1Nb!*p1miCdMHEs>^!0KnPX60;FztLJwN}7vh;E>|7i^aSKwZPp zbmc@;Z{n(|)caxrl1Z94YDTS$mif`TC>B#m4S#$l?uReS>1@v!TRjv$vg^osFiop z3Ec1yBx|_DM8|$B+gdt2+Wo8>VSiOZMk{KxbsETEqXrMe43bz3J;k2|bk1|VfW}}N ziBRxsE0VSSOf}i%^gY0FFMldwBHt78EjW?Hs`TiH)s0WX#E(VMU>!x(pRNEl0?(%d z(09!|c3J9g+xi&)MKNr%Lz~VacC(%gKWoY@ID6_>a>(E=mVmuqrKtH5d$d}xX&NeD z5RiuBXo9`O{xL>+V-49mRc(3kT+>qNP814Xc&F=6k?M%@t6NOb@@_X`d3htI>|zGN z&z3d$7^TV;cV+eyHCzB+pyNz1atbYX3gZfiSjHB<0Ehv&M)7xxzlJu32@Iosx5?qd z-7Ka#WS9+1pr}6b%d2z-ZT+Fzpf`63fy)jTb-|y39hX-WFKTi7kn^+4(;QJI%l!pK ze2L!7r+ad0PfD2bsar6XgD>XWJxwwoHCORf9r0VEIM_qM zCzw=0@8aB8TV{tjzE5zvR&0MR>so`xq~rHSLBuI)mS!Dh1{CI~)~Nb^?^R@Gb*0A1 z=&MnM%PG*qmrKBjp8ZIYS@DFDNwe5Ww=2e65vs{7e0?Ou*xB{?A9P$i{y zM|4xJ3)%!G%8d{u-AC5&>)0?3EeMgln4Yut1`I~s-Cl*~G*Ri1k>5}JY295;&pq@- z#Lm^4Hp$Vz)X?2y^sW@;*ClyG-%gBU|LBB2+bG$zX%YcrI$cSa$$Sdz2EBDDiX$!I z{_-)%I3e)hC3KOBqNUpTOsPtReVV3GD|?sDzlEY;lsV>UYEWf_58h)t*RN0JkrGu0p9p8L{s_RPwvTR zXR9)eJN*RNMO^RZbZOXGNdieWgVSs&xvqTIv}1x>vCDtEk6_WWAVXu?Nu7sREv!;U zh%KMgdA}u72`Xz6{1nx8ud@3we5$9_>x#f2Ci}@h{1$Fh&}3CiF{d z+}gjEHbU-5+06vi&lbqcVU4dKyM_2lgko*2LU$@58M9ER0>@8%8{Q`H zM^pmfKp*!)YkLi|P(GT%H`-^=EmrEUhQ4I?ux{(gb8Cfs3Y;=$r!4-O%2yn10(6sR zU6xmo^&_$SnfCEbTemLPST3#%z3J!5Y}po{ihZicg?6_ADfUcz?o1} zmJxCzhnNT~o!=vhmRTEXGQ4OT$Zvhr5{5Midj2y-p}oGVqRFwQiNxp#2-*sjF6fsF zV6XhhsSL>wR!QmL`QcBPeEpof>)1LNkZE`AL+G5)@6qC>qR! z8+){akxki?kaFfX6i}pXp_`Xlck94~S-?9*q=QqL2z=I4B@Zvi@4?yJho3QIdNI8l z#4QKGd<)2;6Vy;X#e*x_gP*hHWyFFgqukOJH7ndQUKry!7s+}S>|FP?VT3DlK1qQQ zk=oA%rP%@u3Q)BH2;)Li&oL3#M*r$!{Ih zASM=(#VCobo1BhR#*@dO*~PX)#gN9<0l;rNRKG4|p!^Nocw@Iy>-~ZJ?0T#CqSxD+ zevj?m@H}89TT2L<6HsC#BB(?}DykVK9k*1%F~}N9y4KadeB)RvJq;@3pmQntjRuyp zd+bH2w#~~?gnNl>cBMwx5@vUCsl~4k*^~r4aR!EORAjW02r1eGW<}-vIl3BCwVUEw zh(xbpj>h?!;M4gDxV}8^il-Ur;r34S_`LeD#vXa-JKk@`B;%!=m}ILfo6GCRP-vnwGMvS1TCwL(fwPc-To}O1cyV3K?4x z{_{-2*jZ}zOd{hm(Z%1afi9LPcXUtDSf?C9Eh3I80lt-6uc=&~q`FuW) zKHDvFXfegSj8LcxD#zUuFPYuggI{ZvI5 zj|TJPpX&$cTSpufZ23uYl>m#4Uva-%N<10wTI1Mav~)-=p+fo(j6RRxz{*!Z9U-)C z9>Fg)gf&-?LrVVy@(_wx>%nb~#fWvMjZ~3snIE4PjYc%6*#^HD>*h`@M=No(8gEO?tGG;DGL! zIknN6VVIpLepd7%^9kPQ=@m~$#G`d&22uBd7N`xiP7nd~8%zL8zY7$6HJXuC?e(YU zo|ZhfFlXWkh}8`aNOTEuicNS}80_)bI`FU)e}Gw)H(>SGZcAB2IjJ%f(xjS0D3g$f zpKWvE6C}I95gE5ucsGJw!I(^u@Qq2m!}b62JC2|pO%)yPHM(i^a4hL6s!^uhSYDQ( zs6-SU+3-3w$KoVN{lR=H^hVSP#EnRfCNooS9%oP_bri+sHqLwpN!J;gB#HbCT*wP$kPMWfp>3s$!F>BG0nI}(tOBcS z`;|a~gZLF43#h#S#h9K-xNW62tdPsD6m#K0iM?V&GbYaL+Tv1R7X)gj~#SmUb78qLnlqoP^ zSe`gkIP@zojM0&GO=h@|U1Brj_A5+?CK^Vl?qgjE)=Mo|Man|gckYv`pkbSNoKK!l zI{10#kbR9{p%uRJ4wx<2MtMI>or0N#cP<&(WR_(NRzrNObQ6E4VtUzc?fH?Q`SmTe ze9vOyJ~XZ1o3+9UPw0YlgJEIwL%gBxaQO=tjEqDxu@8q>P<_RrX#GyAh7*w=e!%zM zvmm+X4>-{%3kZ>L>`>A9e(Oe^W8*8imEKjvrX~B9Z?mF4pdgAW0GcqQ8K?PWbOtli z6v1wXRcjUM?UkNSiRv~-lG&n=6 z$-Xti>!AZ`H4B7vrP6?>0{7UrywB2v>KcE_pW4LIO&E1X8z-=JL#R3C|YNnMkc!*60bMHvnH<`ilEG%{J&Fe*%+ zjTZG$y6;1$L>`qR_sp}wV!83lNr^{s08V1fY$}RtDBk_ zY{PKqIRP(E+njlJ>;-Ne9DTE9Yc-7W#!7e7F3YVtOg2yK#&M<)w#4K*c(bn^FnHGi zOO53p1ce|18`isRiPy2)Cp&cXWCMewS7U(<3?fr$6<2fP(VAkoOk?Mn;n6cy6eoEN zcTNR*-IloNR3v5#qTkK~&Q92!hff@mt5?U>fQ)(sn9?kZ zoELH=@&o-m=!`QtVP*4!Zq3MI*C)c*169O@A6{Sw1BrU77bX<7)o+B=OKOT3M_qUu z)G%1v*Dw$3!{WTWe}2o~d*W7}{itvohqK!zI4HNk!NALAmrWckmSUmNsWC3}z589I z?(Ph?T0sx*T5P5eOv%MYbRzUJ)6Kn!@@StdaavA^up>Bu#v(VH%nlM5iNgY!YUrMi ze_F{-tA~K?Z+>D_Z`ea`+x(I5S4rc!$&2G#xZi5!P+od8TU36$-U+2lUz(G)^M=`)XHCub}p+?s<^N%UM4vVLX!W z3!0^;2XT5crok6h1={vUZ6hmQ4N20z`>5mfN}W4i2ah$KgcnPPpEs_(#;Q{)27f<( z*y2iflq`qB-OJXu(8w@R=)->-a6|4bNxNMnft?20HkuCy$6$L09kd)G)W4O=9BM|{ z0njynOnyNaTVrFARb&?Wz)KO0c=aeIrmJGdj2T21U*d{=r&%WGB_fB}!Crdq%$!h6 zTYHZU91PZ_u6~E*gTy3XA#JV7W1QF6sjN;@hLE{nCX07QHTpvH15PaG$-!bfNO#d# zLz-yQ&tSY!D@K{1sPCqy(XopWKKD^Su(X0yAdtrAPbwvb;0KzwfBiTWK|Q z=@~d0^<3M_hSR&Ce?AW}16N8iRRYrnJD8B8G!k~7@GQoI<#32mT-zRtY2CpF2f(XA zMU6CkH@0EN1UN@jBxhBao0Y7;t{jc1e4a+0fB6N7b2yPo(8A@@2haBnasAf%nJCjH zql`!qJ9zbokA$A+Li$D^=r%*k928%W0a#oK{oyi-%i#({q!i0)WJ1(aFJgY*$gn{8I=(Ww04qI1{H zye0i*Mr`~uq|h*1yj(Kb6ltw^K@0am&(EmI`#hR*0ct8#{B~3BSz88+3Bzg4k81*^8%KE#*02QR*UK z2M-^JFu#z+ux)Gj9-Ypn7I{$oQ)oL1`l&|nToNk4Tamb^hRS)nuoZIEjHOtFqfhay zZUTan1jXVWhNrTYA$UlLl2*5w4DdkB`Zffs@;~cY=26uyjz?2T9bVi&2sRpcJQEc} zswq*+P- zDN^CmeDw%s_1+%}Im49+!#OjZ;j(Q*hfk#Bm}vcixtLUk-l>q@`BV7ppOrG2W#Z%& zW()~2c*wbgWlG&}uVkUND;LEy@?#C{}77N~WYzz)?Az@B@SyxF&QfwgRVOOn%0aye75&&}>S zzXc$D2{D5sKzp?kZ^aDn`*nF+3|f|e(o$M#yR)s_4THwu&3vi*JPwOBR)%9|cQ^)g z4XHCFEsKY{w1K@z=AIAvPKl3~tb_^UIhBwmBDl`00~fq=Sz&xh<>PA2hJCH!hGwUW zSgtprf2*L$jmE;I<{4F(Ggnc%YAXfr=SqhudnSKgbgU~un2Z{YIR{ZU&6?3OUcSLAaY@eW`eEgpt7 zlUlHem*R=;T?P@87+ei=K*i)c(`M7rgYp~;1v3UAroT0zo2b1J>$(E72e7wJRJ^j+ zfwa{lP}teWV2Cat(t`GRp|FvPh+q_fqDrDbm_Mgv ze11tcDh~Zxw+#nx2(x{He?+>B8}7!V`sarmVDe6{$$s5`AD)NF!*)Lkxhe86X@8YJ zUKj5XynC5Tkh`933miE2XeIrq#2DMX^k7QLZ zL|1DDSCs` zP~b8wgEc_AKuOkS68=kJJcC!LEhv(jc*PJc+JDJEZntc9XnDeon^R1KS8VypEKVS=!F?4_G(KTNE3yww1& z<<4Fsm#(W&-EE|$ep#8R2{KX@^9n+)nbR_CuKu2`y-?j&_Et#qL+_J4;tN=2WAJ?_ z>GAwa1Ld2`rz_J{-N+hUE`7D?$vACB{U+#Df4rK7HY2#|H7ad3`gquCdhAM5`64&^ zml&N+{;t8*A@sURFNd(28=x_y`ZPiZmZ*JTwE@14fXfD|h6GL5)jmGBn&D0L=Vf@m zCfsvhVa?!2*QXbkyXRHMlvIPVI=myUYfFf`Kvx;HNNg+~nfLnniq{U32A~2`%1Vz|wmTEs2e$)WSRz z)ul1TY;;WAQl)z-Kdg2cN`8In{^lIY0O)kQ^I2SoQWf~F>*MJp!pVm!TB9y-tC8z^ zo;bCQ?{j%6p6`I;Hk8t!SYr(BA&>}DrGxg2UYggV|Zk#`Og7%@FQAPviijGoxn3uBn010T08 zQ!nFZtP~|hjSMd!(1+p*Ez!^!t-}`5!O{-R&*GB$6p41JkhO#U#f{uNj#66xGL$#dz~=tSkpT%4i1 zgjkQKiEant8(H)O7-+8ZSoA)7^JvjbKP-NF5#si838FETR9 z{>F}aEty|AxCF?_9K2a!PCD&{mLIaLn~rY9PkVlT{$&jW-^9L(DZPjb!3!(?6gP

!oRptb@n+ zj;Sj1EzP&rTH|dsUF5T#cGro6G4AR2oYP4A6C$$HZsMhb-}MgVJ|9Df9nr7lJz}vl z148Mpnh9;=>i)2Bv@-|m)b&vQU&MMd0hk@(3OOg^&bfmPD_5YKI;h1GgnmUyKMvNS z*Dl@jFEe{GgQYV82Q5l}U@Y#R&i56es!fO#KF~6>m8^j5_VYi$aL3MIurDD=iV!Y# zw)C$KqzsWw6ml!_bkB58+Pnr)j72yJ19dZ;QpeC@=Ysqc6~m1XlxJ}t=Y?#A9ovZP z4*s&io?KSB=5X_Mq0Qr!nZ-97Pc{p8>NN2hw6L1$?|*wdwE()u@GV+8cRmVu4i|nF z2YCia`{H&dzX+@+F~z3}&2HZ~A$J#(3rizQU8HeGveHLO?>XOiq=P#{F`>io&|}#} z+qQJb#$=b8bg=Ps!{v58DK!Z#EWBz+L4AD9zp%|)i>xTf3e{0+~^1&1o6#K zwr3ZRDa!hJPfU|eB7lm6qeNDi)%|oq=$rtSjhii9m6^WZH{st=9fQ#dhr52sEKcDV z){U(4C-G#*1B4TJGjp`CK?-PIECS&zl`y!FXqtN(X=qEa*gBq3^TFm}Cpj!nLubX7V)$@?A?AU0HyDi|)^#d;oP?m&OB|M4~*^s!BC_{@R=DqVy`) z^iz3jFK^wAHbnd?@;r6FdFZxmHA=CJY>9NY7`vW2a@8_3y<&DFpgBkW@T`=eFK8oO zT(y#eS}lrO`ZBfcPaK>$9u2=+_Mtg1J;2yBN4^5}D8XEx0WdGci3PQk{1UaBgCLjA8J&l$QM)18CRi~T;S54ZH(@Xo~$ZF&Js?~!|%D|ZX{Jj z*pc-L3P~#WkVf!P51DxQ^K}CDD=Y?hNA?;=vpqJIB;E8gGMv4?>|>Zb{znXRL*?)Qk_|}2j?T(SeEif3wmvZ0!0BKWR*&#M-@We+n zd!Y-D_)%BP<+!zHM-WgMA-<|E26O*5#V&wF-H?7K{bi0t!Ja@<#T11p`z7kR9bL^I zxiX|bgk@gG;U~e3#Vwfd>bW+G#e;04x)I0s4A&VgI(Fju_0T|cY>fvK^f~+n#M)-I zKA?@0B{P@33F-*DS_^ETL0XcaOIRdDW5V4B_zY`Nd?M#7>oeG!Z^6Ba-dCk{J;lsy ziiSUhyO+>s{C7)Dns`2Rf*jY`gHkmU5gRa2MLAKjTZu0mAO#oAut#vEzYF_C!?|MG zQb|RYeITrDng~^K9yR@$=Tu)pB6?55gtAr{5~EPTj*pnXeR>Z%m;6GME0_TE(4-rw zME3E8f@iqWlgt=}U9DMBcpA3%b9qbF|E~5M9NWd;*ghbr%TH)&^)5!yC%XZ`v?wJT zr0zUE{g^+XtUw(UkwXI0C z{Oks!jZS1P^C2&m%)dTuRCl66MJ9OSvo;iOkk@*49_fS4UK2sIg}$oN5`T)WV_j~$ z#*y;(_hW2|toQ1WCxQ6-vCr-?6*3i$CB?T(Iy(Uu4B{Jjn3Fs5)HYKiwn<7UMvAhM ztl~cib)k*j3wl0-&k>Du))lCI$!YL3LpY?I>g)lzF_iS&;YrENcF9RH%gj>X+UNtpO7cW z=y9bt%UHUm14b%KvB>fmkT=b_ zigd)xBgK2#{h33=bql4K;;83zkU~UB12jdN28+Nt#W^PWf(SsT=lZwNXYAXwH8p+D z2T-wD1`6V}x`JJU5)g?l{KfbY3U{K*jkF9_;!&pOj7b7b<4O5g2XbEfm_g;#Ldp;i zD-*QR?1x>UX&lEA{7w}jiYCK zu00NA=#@FmB`CEgOPGL>*m* z6L!@dqJzFD(40JE-qoB9C0HFL3|4tOJ91pPVZFhw7eu;Rz0}w$sh&XNz#XOq2TvIr zi{~9k7L7M7L#!M~crc`I6W5)r$aG3}pV7pj%;E`lEP-KW&v?w!L}n}ma35b;S~Q7u zWn6QD1W4v?bv$l;!Bx=gbOuF)QJieN_M$nWNG4939a7d{0~7Bj<(#O7(pw&_f1Hi_ z;$$f3(K$+laQ-ssV9rcZ7sUxH?h(ODxMpu8`~q0R@3V<5ZUR7N0B>X7i^k1P11+>c z0#{3cU70M%f?eOzWe+MNx@4`O6KfNE}>-%Ay*gOP`j%nlT#j2qpj#O3UrUg4^id>oy3kT*kQp^XA&x9M7QbcQ+v;w05OGe_zv}@RU3qi z$Z4ZBchBcVa$fo1DFN}YOT80bTTwDSQdcHnV+giyD-Lt zKm&qZyc%9CTM%PKoN%g{XgsPsNM}kO0}&4>JwWdya=9)5Ash~^0(uV>M^ySibGCwz z5$PN+Ml%p$>JJ^#x6tLs0KGyLupO&M$44kv!@+P4tPv-(Q) znW!s-B&%k8 zp97OXN@#wwog-#6l6D~%M86snd|3)a+4OKr(u$6rle32G24##}>NW&kj7TOs3VXJL zc4+@7K%h<|@DEF@-){fDoU^iaDFf32}t$^lA zpl+iL|J2M+g9i#^{QP|PQi<;e0S?)xbB1g1_`<>Y)*w#P&y}I!c21Uq3LcPcH;4bqI0F zG%ZQswtudr3r3w}tQ`@KXB^ZxMGFdmidyI|W43A#-3$(6N2%hin*4IsSIG5R3xLv0o-OG?OH@C^*jHSMd|)m^=k z8q!UF2K{Nd9S!5tX!S5^0(g18+nY#vy3{(tRE6@P4?zeK<>TM)kmGd_VPnQA7kRXf zk$~)TlH+gOn7m=j2vbKXB-!=9II_qaR7Fbv(Ms=PC#2#w`w#W z=rj4$Sqg431ZfI;P81F=%2aAK&1MMC_yLxuW9PMtShb@O%)R9~IY2N4HjJUXmwXHl z=J7qh5e!n|i23lJ3Aori$qjbqY+@PGGUPbj6mN#$9u42-kWv1HK)Xf*7du4zI&Ap; z+W-ZUfh=WXWVbD>z!yT90&Ktv@`?P+^ljzwm*P~Gn%)O?gB56rc2k8*yqZ4@7nX_L)j_!4bYw280A2s4z^0{)=R3vJz7Qz(N>0jX`Il$M5BbQk_^? zmb=2DwO)gQyg->t3JD)mBx;B)gI6cNIfElwxl5wF%+%+FNg$PFXf~%ubeSK6L2;*k z-ZS~l5;+l-wl6{w7Dyq}{-FV>Nn6E;24mwA6(n)DhTzooXGRi@WQFLUlc&&iO=I^T zivywJNawc^=E=0XFqsVRR01*cO<5HEij|eEmVK8g?IfsAJNmq~EgQff zwRv%UW^p&6vzpem6AVaGtc3Q>G5wiRktPK3ep>JKPbd%NiVnQsT{NC%oJLL-qJ!8- zP-h)BwRyVw&H(-~!h9FwJlK~Tt)s~GW9=N{%H zkHahpK^rHdVncAWv!My;Py*&Okv>@=Pj<^*TyrRLzrxUph})=cnGJ9$3I}j$lr?}= zz=2t)jatn_^K@B=I_NPS=#K1BtCqqQnsGNTQfmt49zY^Or3XLIkcNQ*9`Dm{tm+te zGzr-e8FMH~?kI6@V_qIbW6`2CEQp*Gn9!4LSZEWt8?F-u?T9E8^I{i=*dP+gY2|H` zMGdiKCZIJ#i3pZ4sls`onRd=e0U%n#Ca`${WrC4WU~lwxS=8N0NZz6!0k>0lr7=-Wgf`_F=oh+|pA(=&dOHWYHAe`np>Wv*)f@;~V6i<7s3mijc zZ4@C`gzXJ?yt*=6ewBc>XeQn}>W!UeP|~t^p?bStnK{#S5dlPbxd9>u#Kz1>gvttK zd3?&C7ALU8TXCu$a(pA?no^B&vR|6~ij}sirp*p(@KQZ_I24%eSY5CJm0AN|Z&CLzOTfN7OG#0F=>!FqSk3<=Di4`u1Z0Ib8selOlzIIm3id zjw-_NQX_~=kIB1OdIh4uG&6)a$uAeQ-?@5aMkFz+U%>fER>c2C))6vM$q`s74=$Kg ziBjcvbZ75zzxgoHpoIECg8=M24@g-g`GL-3<#WPqoB05WJPdl z87W0Pv(0o1vBq6^KzM1C(IlMdk&y!2xc`xZBy4 zbk(td%vXIm4b=}{q%u%bFrCz%#{%S}5bPliB~ozxLV*SG38`@jJQSBCAc+;i@e`;N zt0M8yifw!cxT+TeLU39XDrBSe#GhY&)-T|b;$R9NG^AMHI2^Lq9 zN)VG}(M5cuIe|8Czv84=B1p?kNhb&-+kCJ~Cp@^WbcRlQNgg+8V1=ctJWBX)kq0fd zAfF&H0wQim;D^RNLt*)8>Blbt34>^ZniMi^9|qnB%ES;E!kSQ!IK8Y>A1x=m76zre zZ2g#{aC_l);B}ZbGf3Y$5Pf?Ha!#0t3<5F`ED$p<#rl0e5CFtqc!!Oi7M~UH7I8~> zKcNUu8%}Z~Bb?-HK-;xoKCjL8>_&0cLO;{MS&3$vA|)_!KSn*s%ug690fdLcraD7- fD&x8tjE$WbXjs&snU8)|^B;s6yTptcKAzx$Qp3K0 diff --git a/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.svg b/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.svg deleted file mode 100644 index 25691af..0000000 --- a/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.svg +++ /dev/null @@ -1,229 +0,0 @@ - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - \ No newline at end of file diff --git a/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.ttf b/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.ttf deleted file mode 100644 index 67fa00bf83801d2fa568546b982c80d27f6ef74e..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 41280 zcmc${2b>$#wLd<0X4JKkMs=IoY9(#guC%-Ix~!LV@5XgawLzwtVoFRi&4B<;Yzzq| z1QHw)z@da0*@PsIyqA!`6G@b6oWOe_b_$P#@)GbXG2Zd-d+unfZAkvV-{LBX3Wc;?Pswd9i3FaAXkSUrx`&zn7GF0_`M^SUUB}0?t9iO6@<@rQX4MYaNTB6W_twTb8q4L*yS58+j!vF z2j3Nh`>lc?ZQXpu)z^G$?&B8=!spQk>+PGb+PGPLztt}YU&eW%aO!9EjS$4lmWxSf0(+a;I;S#pX$!?81r zPxe(ID}q`APM!R3^`f;)g#n@JcY^fY+Km6eDgyYBYd&V!e;1`7xevutA z9r7HC9qK$ZaA-Mx@w`Ku58Zlb*I{&GuRWclsyf4l#;7ri09Ui*6RHTP@wSWT=t=8ZXH=9myY8a)#IAo_0fKca`D z*F~?2UK+h1x;}btbX|01bV+nx^t9+egvQ|i`5yx>jQlJU@$>W=|A&(_6vm%?s-YdZ z;Q!}OV(bZjm;rz1-#tQ;_`j;qrV74A>f+@?>cTDSR3S05S~a&0%~;2e-Lx)tKxMv; z>UNd2#a>sPt?jDVwrIuBoW#0#yDGI^Tpd#fmJh|%fpzVw+(uuGC*n5@{id$Gt`64? z4cEQ9t}YQ*O|3)f+%4<)iFNDnd#1Lkv(9K&&23r(y9;-Z-F4Pkb*g}$v9xK8{LsMY zA#0mgiS=dLRa;x^Cc4QF@cS`UN-jvmR5`U!6_yWe-?)84j5em!#pCPhw)4Fe#va|! zZnVx*=ZWJcj<(n@cz2v_v5abIJ!>cyo0pio;gZ-;tZ<(36Leh_-5IxzZI8{{K6gW6 zdu)4x-!7pFD~8koT#5eCZPkH|w1e-s_?>1Ptd7U)Vh6W_4EWLlv~6{zZD=1ZbGId8 z2P-#E#D*5Ftc$B`-OzS)XhC9oBDQ_O_QVEi33Z3wsXZPV1}}y|p$^c7cTxw?(8S!t zhD+9u?+Ja?*M?4Pzmv$eu#nhpQDe)8rq_KJXZ&sZgaI}%ILH=#(<7WO@OQd+HCi6q zzG5hG9$KFmtiuOO41)3lD~5_fOqg~4V3EZbKGfLxYR$%a-ctNxpiRY5&;@Vp#E_7w zkT-73wkGUcB*ievEJBCIgv|7!MHb)9YG%{FPcKR$HU&+h!zMahw3wx1(~FFb=ajgT z%qfW`HlV-tm%m7{V~3g`k(p2s3i4uku@Dj(1y#tXRXLTFRY#Vo)fv@yP&H*$Z&|fu zwHnqcbawfA;^}-y$tn4eB_4=}ENLa7Skn0dlb+x4dBA$NMe@P+tN3)UA)gG`7`p@g}ksuP_r4esa$Nz(oZ#Y*myhQ zydBZ3YRahfIn`WNYqM$~qdLmPfP*d!c&KGlGHRZ;tf8!hquH$5;L+MytLn+B9c9&> z)%sYg){s}cs-;hDSBj2Uwy&>`sF=@n=M(u{Z@xE|4FyAq?hY~0;1VryOWYj5TSU%f z`^BD|*kB}m6&MwIx%*C_4-Kj)_rGq6J%mIJM#ave| z6W_b;$tSPtXlr}!^3VTT99+%bTYl9u??3I@aP6-itZ}+F;Z~$u6l4`VD`Otmv91d} zER<(S#b#32t`d6j;d0id9}tJcA&h=ofez}MOMLIh@MGecx|6jH@5S#($3Hm!f&3l$ zJD6Q&(h@95us6di-`kyGsRm0GTk_j84vH5XTyyaJs;URwjqa+=zdhYJa8^~?^^8KtwNh&Fei-jtC-6@O7#R52HmK*O{ zb{aZAuyEO0ulKHHb62|T!ydZ}`=7qNxi+xAMLg%B;s5c3YOm_eH`jzt&r4U@9n$wC zpM7|lQe8tUd+7K(@(<((1)oqStP_e*@>*4IMh%tKx(s^5)cTCd4yu8&8t{;8P)(Qv zVE3AU;@u~S9&cl)PcOVYDiH%eQKR|9}_GlobT-NdeEVO-@<}^H#0Y+ z8Q5L)1Y^CPR4l~m!D{tOS)0XjnbmLA4_v#m^vM^Q_j}*d-(&C6IsFf%o!9CIaPl&X zg|#geFV+9@;`eX`hJ?@aA^BN(won6(WNK|j6%Gd{TZs`|W+=eeBozwtMwk^=|gMSwn`IzBM5z3t%CUFVn_xPg)&+-Z}Nm+_k}F^P&%JTTTZ;stRF1+?)Mjd z@9iZ^PjW}`nw`J<%#J^P=9j)n&CF?*>`C{+zjvK zuNOv-VW}N|3CU6jr(;`3FW{u)Z?q=6LBotNQy3JAAabkPmIDEaWZ{fDos*^;yfMJ( zfi(x~V>RAAS`5<>L~AaqQ?lA=oNs!R?p{dTU_il`#v4*K7~%2z>|@S{!3BYEIG}H) z_pxnpX#C#z?d;e^VeztYJHy`@w=?040O^T8t{05-eVK5saD{M-a1YjMP6ciHrCKltrL=JU^%w? z%G&%P`t)e)acuLg*uJ=|U3XVDtKG{fM{{8sGiF08Ye*?QAHB~$=KSRE|D)H310@=Q zQ@pWVr#!_^eBAl$=-)<^As zJhjCaXt;)F)BDM{$J2alXh-S%@f4-CE-W<2@5?O&s9@VPh1%VaGs>!k%%NCOX!q7hU38p|b zovTxd{u+j_eYEZ&L7wLVxj-V2==n%JWNx8UD3m@%8`0O%MTNo`?Y_YEs;F@G1lm<7 z6B|dFie`mXi)&WTk!DpN9@opsy47=}Th&KCR=bk0jD2*^NKaw!Rn)8<*XyrZg3!aP zBWl)*%=02T#&ty@BtHoKp$@D49Dxi+JJ#tozAjnHMJVYQMGK5M)#A~d7;9g-==9M+ zC+sLPnKY*bgA}T+PoUvsAa#550cf*+sDeG+sdP`!3k^+d=n$DPfw7($6FBsXCobH2 zl%02U>xEDJ;>?F$edpDO&Sbv{2MRQk@FosD&zkxl&zG*#jvm#nE9D>W*MI%|7F>mk znUk(EmLpgb1%W{>X`^~fr%;5k(W+UUxg1kH8C5<=T0J^pMJF6Ela21U%bLQaO&%6D zgK<3auK;7Dt%RX3F)~Ql5#33aHxvaxlcG>7)XBT$-NHQKbm2UK)a&JCbx}s`1@%^N z>dh~!^F7)U+zkubO3-P(KsMA2u>BHcpF5E2BUWhiYBd=cmfCW#yk>y{qb^eRN%8a? zI@{~jT2CW}_xYn@Fv={!P(BpIW-dEZ?48L%z4>&$7n?oZ88MY%`Bd7HPGK|A;1YEiG@Keut^O%am$rsLQ0x9U0T7rgScss@?4KCe!Dc zCnPOzoBkzKkurMPR~sJlqu6;PIcA{-F)-Vx|?r? z`d|?X$B)aZ$q&7MOasjecMHWhX;F=^_B*??Sm@K4VoSC+2X&#Y3>A}<3RfGBXENMw zg?V3lkXD^WkCwy`019a$&9s)?Cn=eC2St6RCAO;o}h)=XB2SH>r+jiH(R9}{

PBK;&Wcg|NX{>QR@W3{K zY;bp3^^^Hp4EgCcp#a7O7KV(e2E!07sKTguG(W~^?4lZ66!OsI#=Iw^QS(LZUvY)|-*On%Um?5>WA zl?50LJ%&XEbBcfmH}zOz=!^;alP6P=Rtc7q@Q=l%gyhRfi2{4}=YdE4KV#1hzuEkL zQ`e!oCxJ!)KmnXWYrzo%_u;5NbadmMK<}VRv{vp06NK?w7^1Q$Tj1RM!76dG8csvB z!8uB~T2M}Lf-thpE(M7RjA_gX6%1j2BB6X0eI$mNZ8{a1K44Q>^W@3P_G84KehO22 zJG-|8&J9&`rg~weKrl1JkCIVq&`ucl7;DHYw@0%Zyc$6}?KFTU+2;?{&=A`cEfAzN zU!jp_g3S-`18T6M@<#h3A_2$=zd4rj5XfwaD;BKizzZu%((a@Bm!J{db@_d4*S%kS z85)uJ6H=aVdJ9w~XjG@unH$c0h>vFo<4HQ6M~DkI2t|eFJmy!hTnt8Ojt6To$AMXy z%Ec-Z9jL;jXKDjiV*u!Qj44=K))MH9htwFwi|JpZJZ~{M?9ff()c#tpX0uYaf>A6l zaV{Qgbe)MnbW#laMf4`G#PjHlIUp%<3ly2&o*d>RpmOTnmY2VHufF-SoA1<)E?~R( z=WgS$I7Euy4Rm(-QH_=+`sBw1ta=csoM*|uG8xBOE~wUwTAd@51j zuy`QZW4sK^2*CTH5tN8z;Mj{$CxYdT<=Hw1#U3GNO1s#SIAVG`KswTTkWM*}C5vDY4%wW!qp-T+P zjiH`H`Pj08wXN8~6_I0Gp}9bcbE~-^4mD3Jt=O_gbB3QV zH@0hfXH~q;wCr?tu*vs1?)CViBPBqx&5q{6GO8C#^wH0-chR_FWDrbUXgQ%zxOyH_!jd8*jbwmGetZ z>mI90oWQ{QRn`etwI7z}UM6U%>aS8Ge=hn7*WU)BCt>J`RFVl82?Fd<+Sqyf4cQeRYe?3g$5AO038R??pu*~f{I-;y@--*Usl#4Re< zL0XHkkYPBDUr**?V_4F#Mn-@8g*jJTGHZ?Tt9?CpKKr#hdN1F8-^loVTRu^_1Pm+j5TO#%nF7n|JOqvwP95V~0xY6*TP0JMx!rzqf3C;CtWMZ5^~0 zfB$CDI*O00kSYqexd!cwb5wk$FblTdB4HV028U~%vtf*Q%f;rdIV3Y`GsSf4V#7cw zCfk?Lv4)H$nsHSE3V9aY)Liqi7Y81?fbh=cWVC3e2(E;^A(2-yY~Y<$WZLA)Y7gE$ zT8E=mZQ+p1K(^Syah8q-KrYPTrn>-c$%9<8=VNnP74)pTvUR)I5b;omxX3DD3l3;dW|5Dauo)5oQzd4%ke=n%?~M z83VJpFzJdbi5`Mmay@YZ(+%OsARvLo1SC=ifx8=s3|(X#g#d^XKyO?vL1Z#q?Zb;5 zA-fy+dO>$`EsG3s{LwJd8U9DwWodXXebC_2=_AG&D82jX5Lrq30g|WU3-n9;qCyE< z1?eqPcW{p*(2a2s325o|LSc9|Aw45lHu+UfTu(L|)=yFP*VE`$m9;=Po8=Y}R!}aM z;WRW529hmKs7+7^%Bl}03PuiYIM^lC*n;I+XCVHGG6`wTL(U9~xvx*FgS6)E49qQ% zC;{JnAPtIzXtlv-0G~aTPufS%E41M&N2w&e_2F_XBhp*Ps!L~{dD73yyf)TNi=pdT zNP@zwBc%)LA(R5GyG`y`07Vhif3$W;Z9geJw zgy{`K@NafEbUml^`&HpcBusC(FOTyw{RZ@<`_@2y18KsYLzqEybJdUOVAyuJKY9E# zy8nLMKS(N6XIC9}f=p~dGDqksgTh&9$ghkW;;y0tOrSfn>_uvl!!@Z%D(&MWjXlLx z7&NiNe`EN*;PWEA7v?n9Fnd|GPcWzL5Jg4N0^J9*27q z7YoDQg7}`yo;_9#7Azd&p?6FG5Qp_rgBBy82SCT5LYo66_9A;R95{9;5N0pvbL5-- zkqE^(jjVfQ!-e3bgNHXsw1b5N%MmuCoqMP$v;wgoMTy5;j9QS;YtRL7CxS8nfe{!6 zYy=iEL9Hy%fV~2X0 z#O3|xh#tG%Z}*6UDbZ(VN9;Z^B|7ZGd+js^n6tA>CGoYbTiF@3mVJ2J=j|?+o!-zl z880I~AS@(>cJRd&JQ@M$a&ty)hnfb@Dh49Udl4-cqa2@%X3*EDM@yqOtz|8Tu0$~m zYE7Tknnsu6jma2wNo#M$UbG=W7NHtfw2m$aG@p0Bqoy_kFC!^NMs$OLQFh2!z+Ix7 zM>z-tp#eb?{XvR;XdvZpTC?;Pp)|W?cP_uOrPRD)YKOzQ8=6vKS83O-lDU7Vzki5< zI&>8&P1d?OJ+0UY_@_0)6vj2XSd1>}KL?^m6nZ%CJqw$-0WX955Z4na7eyyYccvyX z2oy84(4K}4Hj~9e7zP9&q!4U^wJrfm(Z$@1`9i)Pc3E?Oqwg$s=L%125BqXMlQ&{E z>$jY(Us+x6Y;n8Ureeo6gTdamKflqw7Liabz7AKF^yV>dXPvVae))f8uY5-TK6nmu zLi#@DYYY})m#|SN#)#+QW#bcJM;M=$vf9P1p(+nJjE@pf*Lay0t2mY|j1H`cWbB{< zX62)l?7%1mF)+<>Y}EIuEedwkE&~6dBlb|JM0baj?lBR1Nh1-F@yQZtvKvTG?J+hI z&{0KOurbPhb=|i^@dk$zgzj$L^7yjSm)G5T(>afPdhw-uA6jS0HA&OzL*Xj7Wgb&M zlRrD(WVJ}n+-Y0puDW+gX~U{BZY$ilWW@%sA>;t&rE~??y=UgvhIy`es<9(OlyR{j0uR*$h-@{gKz7%1**%k? zlOYRapLB|@$Dc5IS1`Kn&y01wBjCvqRq&F2I@d%%3V$1Q2;S z`7-d2?uP^NVzR_O+)wXPjNWMt!S-8xyPDp`A$lL)3)O{|74C5YGP5#~nRMds7vZ5&8wZ(r^v{u0f2-j0|9Z zip8kJTaaIQyx-V2iuPB)t&iCs->brSvZGsL<3W8K8wA7Ug?@;aj&AC2jc$%R`qBL| zdSvwOCdpe&d%pIK&4rQpkrkD3LrejN4lxDjC1MIN zbgOuL!KFODppd1J+?pdF&NUDdw~~%f^u#*JCbB^gHccU`=Qh4}PL3Uz9NF=4`(x0F z!4s2d^>O=SPR@_sBD`gcXa1h;e}L-8c74pSj2ky(lN<+{$Yqronrf}kB1{D$72{Sr zg21pec7W=O5Y$8JI+^Eu1%a_gQk46_CW(W;L$pl@_}KW$rQ}4Z&r>0#QMlBVns7F0E8Zllg+cxU*K5-Sf8k)>cByD zR+)FVvn&69**9`M`(WL{B4+Zf|eCMz5v#4M2e_>(&f1matzv>$xLYm+}2ysk)hGhn7C0 z(gTPkq8vJcwj0s41jbqohgBWoUbHHi+8U;|T7+t@X8;ywxom{_xz^qxr&GjB+{7?{ z?)snKaO2OeU$Eex`ugk*=bwFb>&zD)xMb4<4;6Q*3Y|V%e7a3;!|_hJy@6~o6q^?%_}agJ3LmN6ZCOp;R)DbTxD_!`^<3T^{|m{t6j{>eFWHUZf zm^jAN4w)_Frm6I$XQV5vUy8DTjRhK9CUnLm-m&`L$(?y3a^Z#NM#AhO{Xt9h{8?*e z^%*@{9vd3z(Stqc5R0b}Wx?3b;V$q0wde}vW?eScuf6D37=90||J(*bzj%*0#>V?H z=Jx0K8Tas8B2mIGC}KU1@v@<#`+~6f>6ol&u{eSF72$P?(XxpM!b9KMW(*efuT1XT z8dfLf@77nq#YUqP(nh*8r}Q=I(+>R)bpG_uk`0L$)=UkOZjMm&65nC&!Fq&!W5aTZ zcq>1=B5*_zBuv5hn#YexXy!64NHIZGAxJb)(FDv#0PQS*H3Cr^_^>gcu0V`%0IMLy zE3x$VIT~8}zWy5U&60Q~YkJu@^0NMG{lLqJ@4%HW6O9e~_IA+N2Pzw0K?h<+AR-Lf zqCJHCVQm}rU?7eIF)rlQz#;T}S| zkDDU0&~e-a63FN^N1Ke`+yL%j{4?%Uxe?v!#GC0gl^a%%-joSNhi=Hx(eq+U;+S&`Fa@@1PE$UPzM*eQ7r>_r@;&9^T|8jHMYXl7SkT z#`hU~qhNt%N5t;oAIpoW!<3=I-ZFS}+!*19z=J>_5q4xuktJ1&?ts^Gq?H}xCMWxbjzPlxD9Qk_L>0cH`(Z+GzVq^oEQf(Ocfzf3 zl6xVHWb97-J`?UiV^o0OOO>0rPUEfUG^EgwDnsl%$$mrV$^zP~Z z#$5T9V3GbNe~riJGKAiyza=jJi~b1P@E39Iu=*Fa0bA5J&+%W#E97g)nn~JNo`oy{ z9Aq2xNB$~K53phNMSkhAfCbt0{@yiFB-)gTmsV4PVs3&S0q9$Ks$mZp(2I6rax6k$S}jQBXCO;9WV$4Id%HV>U6FP06B+x-ED9c3}wu1qy@_{Yz3EU8f7CQ}8fUNcbR4E(RO5=;LRnx%r@Mm`?QTUg1HYU^S40y) zeeE|*g(uehGat~j*M|NAxqDi#LF4-sfg4U49oeo#ClF8fN zP@m|U-Bp)8eNO5wta21vH;!M$8qw^uTTBw-i#gC)&9mpp#UG zqN%=_@C`&|TOw(~H@Yy6KBy4;8WJ5DK73y6A*M_dC@d%3r!u7&X=>)ShtiWn`~@5t z5ix`gxR?cATtL`4sN*==n}>fEyEuqbxxn|McYeCmyJeI2M?b20eqHG^cSY7$U$Llk zfA=e;nvDxfi!QJJIefP_-CtWO`ImokPU(WZ@t0nzd*G%8msS7dC!Jp^Exe@q$3F^P zI=^J_>-bpD=vd5GC2r0Lr8h!5AzEl&li^1(Q#|I&Po9548x4-*aRC!KaWu+rT-3v< zLcbQ=dFN##|2d0|#&wPl-~6|cOK>fpbL0C^b3z}+ho@HhK#{0peK6wI#`<75H^)na zu|7atu~W5v(~h-2-l;!+%7*KS9c#-w^(Rhfb6us)V0^GYF}{%;YOFXEuL!#Hie*!VMmqEGUdkz?-?<3F`puEwF^~KXmeY~n!P2F|69iS2 zekIN>VohjEi$2q68Bc%4?+C)ba@`v6Ne_%^YPw4@&%OIU9;W`EtA2G`>GoHjxzNho zMlZz1*`F9MYs`pmQ4DR7sjiIXuIP9nhJQZ1lz8YimfESme%sqSS?V@@Gb+MV4oEgS zf?de21|cEuly`zIXbBA6xB^>O;lI+r(sYsj8ryptOYhWQyG_Lree*W`HL-_&EWJa2 zZ5t%B5mWgfbT-O8UBc8-Z!+zF*_u-cy!@&^T?ofd-v&S6{ieKMbjhfdVCfC!dz0YTeul6S!&fa^ zer>Z#fhirCi#LAZ?zb*#TX@lxpSzRJ*dE2Hs+EI#Q!~%Kbye1HGlgq%SI1&6 zVfr$}6FBAB@_zs;Ng#@C0oP*Zl+`&NZ90ZxAzstxfPJR+LP>*A^CLw+6f_zeVL<4h z%S4b|m+zPJy<$2T3Z~)n74y(=B9cqCm}#3`VY1Dg8y%cFrO6$0`IoIxOwpj-=9VO@ ztELg9A2!VzaHk&oYA}$V=k_jJY06c#T)42qEjnc@V-8QPH#Ie6adppR-x`cexurc| zPxjA<48EIQzPAux(B|{U+##!j$!353j9Hh@dYY}gtZnrpCX}G~)NA)!qZeHE#7gJ1 zy6(EBP>n~ncPv>G>$n^u=lJ)9o8))p98j>Ch+Uf{P=pNMft$_1P^~FPmF$uAO|~A$NM^was_1 ze0XYKq)Yu@wc~<2x-Pyrx!C6yhnnn7YgetGm&wdqziKUZChyzV&p2mFYg6v5X&1TJ zg5;d3H4E2K%KPdCYp>oq>*DJ5jg2%-K??!2P=Q5KM8j#qmxZF6W-3{tgBgkjReNi{ zJ>x(B^EX1E)vmfbT&nZCCe6kE=2EM^i}>z+4!6_Sy3fPkYxsLDe{baPNqR5hER~W; zm|>tHUK%md$oN9qW1s5i6P|ZCt2{NejmeJ69~-dakjp*cU`K~KP|LuJL~9D4&ang$ zIPWF0RtP*3G6JC=xB?kq`G`mZB99V${*39#&*?9JF1h0It1eF4ANs}f$xZigqGm#o zscsi*N(I|94V}IW+t8Yxbz4VOZLKAF#>UT%kz3jM;qrR|8!xU++Bw{-!2p_onm6Fp-Xb3Bu9Kb9%gx6GDo^8fi4y zLY6et=YUcNDC>&4q{)@63k=`vpW+|B`M=nA*mv|N$l)`4_Pm%JYcRz=JXjEaIoyt5 zH)PR3dnS=f@mc|_gDS>xzCgjF6dc`>QIlNGLa}jVi$NYG8LUPWL^4QG5R{{;wSv=w z2n*1{5wgi_5o`vNWY3V#H&5sT;T$Z&D5p4`RCsQ2h9xX!s==I`1f`xP(Kb*SxQ zN2Wpz<|LIBLexGyi#{H7W98)~s4&ZjaYmXOG*K+|4rQOE%FFX8Jh0MWV|R8T6d%|q zp`_q4nEHr*4jKDcAcy`+VHuAM@714T(hWPF)1ML_-*LkubnveLPKRD51ob6S*>2dm zfB62LHyQ_s-)M{|X2T0z)TpikG{i~H>2WC2ME4j&uuN(sT5R}f{bz_*V!J3H%!r>S zZk|Ro088`nPlB7G1+o7L}Y=BVO;jg9^4^pcHV{O%VwE=gCLp_f8W7KchluZ*2l<8b)v6HRR$)r$3K zsb$5@mt46#ms@`2B{#2NYlyP+BJ#20zZ1SGUnIRjT9bq{_B@OHo~>saemDHj?4jQi zT=si$7SVdH@VfkCnQK>Y6hN<>E6x@Nf2Tj9?~%g8-w|j1oI+2QQY`DNA63>7PL4(4JfOX|%*2>y`#BTc)D*1fwSL`O* zZ!IBiv`+scFGU0d9kr?c2sZ%Kd9)F*zKnD`XhCy@Vgrp=O-^kC?LEju;L*Y4d;v}c zHX+#r6{+!{3ez4Ti%0;Y>;ouETBsgvYv-eqLUE}$6ePk~31yXBVk_e-Djy-NtTUh! zVtJ*@;9g35O>X4W-kLJiDd!L}-1~}Xjd-KsmN25OTEba^VZ~7A@SU-Clk`-z*Y~Ir z!0}@<<*Fc`y; z50@i3geSZnq2yKRb|azH_-)K0#Q#!`hzDb3Al8`Z$a;jukBC&Flae7u9v4f1>_Qk8 zWA})I8!63k+?|e9Q*PPF)FPmPu@3OqHjIxAnh(#7<&~XaO2D*54JQMZlabJf34ts| z&ICDp?d6wQ3u}4#W&I#=IPor|g~7l0*$nK_ZTQW4o?S%ts6E3=LTRJnWZYd7Ckce$ z_R*ifPw^ksfA!K!L}DTcU%%XtdX!%Pf31_as22Df4|YL{5-1Mt@#8LV?bVH7cSwsM z*%0N$)S`&^gH+Dr%jE1agQ%)dRo7S zi|v9jWROy9wfOsBx;-@9$iwK-WC`&gMy##_vMLX&hgVgDR|hrM%pR=;ZOihsX{`m0 zMa_w@I#Of6vi)c#5)d_lx?HjrN_Ez+txl8@Ao+L*1WkzEb7!BSv|qtK`AvPCk9?C7zt zm-Kg>4ptvvr|Z9yR&ck(*YPc~hZlnW7l1!nQSGRwl0}4M3q-U=b0kx%v&Ci}Q{9}T zytwX+QF^F3hhDWIf*4|yTq1eoGv(pIrb%lt2Vgk(LZbjEW-A$TrU)6H=7xoJe(xt{ zx^GzNHGBQ%`0>8-2KUS@iodSbYmF2xd1Tp5f1NtjTg#qsPMJH!(RnF5ClG#y&0BJ_ zKjy0q_!^n-mL>YPoERrJ}@HYGXmgax&nlYmbhyp{dNo3 zAK-5MLkdvfPfHKAKlD)hp{0M`zyHr8+ke`}zJo)5+P9CNez@)M(m(Cr|EHyg+mNnI zYc!2HmifJCX8 zEEhm2LMf3Z=Vf8WR`=14{{x)g!Qk0xTV#6j7}4-7bu#hkr#i1wTB38ASx_d?BdDvT|Cv($dQ}e z_jca*Vml8TZl4b6LP>J%==^@CQs<|PAwjEaM3)nNYO|tN_i27$8O6}_(>S`E2Z}+y z{*>i$*Z|2-n(N#@@_4--J>_)@TxP%Z*5f)H(khK7Zm7zc#*d#G@PI^A%v zq#&91Tb%WBGpAjcXqTd>W5Ac1GzGL{Y2vERE)hb|WRL>13z<;nu2Nkh4JQi1-yy@} zc_nF~L^q4e)BmEUx@ z9X1dQS|A+fpfF7{2^sIuSxqijEWL;coF^3XG}oqJPEE_G0bmML&#c%SAiJx1D#(+= z0T1b=RL_ramu7OZc!9ZSE+kzdt_uRB4#}Y-{_k`W>_M?8=@j5EGh|s1h|+Y*4(O#x z6%3gaOPq4ZHt?p4RaK8R1@vc@?pl1kJL%dSJagsq!5X9G*(`Nxoo=%NP5r5Uzu6ak z+``rnX)alH`KHzSFIG8O)#X9Qn)|#}qcmbAg3^9Sgw$V0e0!|c0?{m(l6X+P?1NfvW;@SFFc>kFd6%d41Ub*|j8>e9|YV-*{2u+h0(4w($QcifKyoLxB9QCXMrgQiF=7vW{eSGiiVM!6{ z6T45pTwHy_Z}yzKM}LPL*zi^RnEjO(S&Fs1RPmubg*JJx>P@LwW|)EqxS=*-A|uoW zH7qEULGuHVq1sbH1r=-+66DBICqIV5v(%}oBvt$n3C@Ox4=uWW{GCheK57z>ecmA6 zV532g>94=|3h8wdY1Ch#k%E>OsnACB9a(CX=sSgsStne=WTlzlu2yZR7X&g9OYl~W z&D=?v1aH#WUfn*>e1{UcW zIL39L@k5E=2dYPLk|vT@1qSxyfqaY#{Epa%@+g0K5Y6*>;R~oBZ&=!Z(U)b^&t#bT z5Vv{_5jzAbVq_o2gz}T6i-8?d23#(a4?cnE3s+xv`yF?G4kA~z1J$f*NOev-}lMFTj~RP~}vfT;+LWIQ6D!#^cJg zIgN6r<`iMgxQ~k_e?FMSn?D%nkn%ZB((CywpfHYi_WaFSXKrB5V70Y+Rj|J=Z0(R* z+Re;#(I+Ae3CYz_<(jM5X2d!?S&s}rN*1j(wIQF+VfL7t>dek2m&+&1N!et#R0qu- zYt$RE*_#tHoeo>H*XgiiR=9m$cWZ6G)jh)<=$9nqEOjwSs+H`D!)s}IL!eMxu(76d}Ac2|qP#^&`&Hb*EOh*{F6D#;`_CW1~$a(c~n25MQ-Zb!({aOIWG zMvL94$knTvXqKJl()t8TQxM^&xC4<Z*{)9zOH75B7y#I+k=={;-X_P1_+_N=*?;io+w;OJ1Vh4qkqPjg=tRY)al z4mBoFSE9SD=DBqYCu(Pz41G)|=$BJaX#jvE=05yCJqNX}KAw}nYg!h2xb@aU)*IEj zB%csw{AAPZ<1z|>qsA$mhP+whjk;59!wN<88~6Mmck>5hhTgYMwh3GlKp^s{NrvE! zV^k8)*fR39DlS!Ipd$I%u&V`4pgL2OMn;PhiVq+a7J0A77D~74kCx=cKoqGW5EX#I z-ep22d?&WPkzyb01V2c-29718EjeO;7-w7xG4#60)2r z`z=AIs;LU0n5A`B&|Fw?)hHTeKq;h!8dx0+Q!?Gcq@o5WH$9+$ma;mnnT%tCGNv^n zkCPA$5RU(G!^^rLR&H} z*b8yumBjTpQrJ;xBW0NS{bjY^!~G`n%lq>4XIbI(*TJhqKP-iWPElO}yNj3A z(E1^Lwf5=IfATOLp0l}qa>j@{icp}nMQ|!4lWUZHE$!3$X|u@)!ch~7mO(*+&aP@U zR-tRG%1@AE_lUl3=;e3jM3}MM-F0X9Z5^j2^cyX6*!6y2s4nI9G!Fl!dqMsT zo5|hTn5y=(v$|(&>a7W#yTxib^VqOuj%b=SMe$s)Y|hF}XEe>z1$OYCm-Y?Rd%9X$ z+vr!%%dAzzctXF%GK+m8=m|BZ=@$oQCi({&8w2!v`5sw$=)8?*{_VJ6na+;S+JE-i zPc_E#)%Y>`6CsOxKKR zaZnY^tD5-2PsSIAqbN@SWP!6cjaArB%XlyZ(-xJQV7bCS&q=%drQ7d0@4|a-doi(g z*1VV2E1uS?<_^xAwKnnOjQ)Y(*&9||=^U8VzrJtb)Gb%#=1)Ig@_h28+irX5lO1PV zI&bd3d@>Z8dfVL7=FYqHjE=fBr}YQVxZgR1(`PA2!pKtW9@A&)jwemls zPF4=+jvo!d7&Bh<9-)k=fRAyunE43^6@;KdJpq_Zl~8Cb5r#RqWA>S653;(!!5vn| z#Rv2o|L0t9M>s!tU~q@UdGP^u2lg|Oa3VjrWAN;A2lPJ>Q-8e0y+*%}U?- z-*dg~Q}TmMJ{#Y%^KY$Jx^m&fC9OCzIH><|fZ8kZJZh>PNEKAV6bH{etq?r0su6Yv zM27McAdWCH*!LP$Uw8!#E^0Eo{7W5z6N_dOoIRuv16SbX+(xWo)LDpoE1CJF=@&fw zuD}j#NZ>M5a`F+9gY=0{o7OHg`^1jHrJ4B9wq=FXoE6hsrAMs2 z3kMpeFV8m>A1Zu)byLk=kJ93=x5zUV{Q1eD6---lzMCy$W*3U04&~3fbCzZ4GTGNQ z^Wwqzi>map%i?RBzOnz)Pdb(?Rn|6b5+mWZ>VVk-K*DRCHr(pHV_+U0fq=0r2p347 zLrnE7VTVAN7wiV8C=u>WM2UGHe;|mDKM=&{s?Zc}qCQ@OzA;;@=G70YBXAg7IR0g! zdKyTZN01chB1Fk*IFt5?QwC>|&~+=%Iij(at{m;SylNY0+kz!cYbWDUP_#BIa-<36 zh+d#2mnz7or{WTTiy=`c1T%GIsm!(@mzsRQ7gsSuAfF0rDwoYdw%5-$) zYp1O_r)j8oZTF)3aG`xpy=i z!Wf~#8(bv7Y(T?paY2HMR!0TqfmJwave|uJPXL+= zGUae1Z<#7>01QUQ%zdg=!I}W0my}vO3!_Q_PK5zAY;iw*C zohlD;OcH$sS%AAhasq&EIP`_6wq9=2aqGh&9$sNZCZkDtHF(7`g?{ zCQGZr-NefnGhMX`&@q&#^MjIqcu)iZhNtcW+Jx4_SB*$+FR!odrScx=lnZMk z`rsh!YM+mf4h2Q?CoZ86U}EZn!daO2!G|h7W@5TuDnLpQ{zS#t!_CMq&lG)zATyMnU8-xDl+#rz&r|`(V-H@X?Y4CZ)2I zys9li;xI@-NMHVd6wQH&wGX5>vRFn4jv2+>r~ES)7!fB(IHHyr<-52QTOm4mlEz;D z-`eXyd)>Uf5HJuvcD_#7z0_WN@MGGGif7~6JlbAr6R1ipKEk&Q9vN#YHJj)QNeD(+ z4Bt4#!nTa%?gCRFV+>{h$5x4Z$ruBAh`4yDC=(-2;9D7q531ykQ9|RR@4fpKN;f6X zJd#h1%tgZ89(&t3@%CwS)Hr9@lt49X0 z7DMjr$G6be&fa^J+Cn+8UwL;zBTHe^m3NJd+3_vaokx!n*$ltm2<`si_VNT@ zqrGVQ$G10BN9nwyEt=5Y0_w2x*1q>B5qx}W3+Tv_|J%0y!?cY{)Yg%4p4e7)gg4e8 zJa}a07!!bBml!;WTGflJlh6~AEpQ3AcHa4E@}@Ev7|o=zzC-d&a9+NW4xL08ie&h`Aa~I z5b*~+T_@y##U@O>-h40O`Wm2X z2^RBf))4D>$YiqFY%Zq*Ri|7wYe@ek`+_K1Y&N%DenJ0Wkw>)n^o9O_!|JXQFGlJ- zLt!_k+iCNdf2sd`jgR<|&t*=xYRqL+lLLctHO5Lg*_3L87!SmCKrB*dhcUIGPtk8@t`e8gva8;$9z=*K^)S_Vk-9~LQM9dJt2mhw#fJydT zbxkB1Yb31~`auGO4g$D&&T0er%#YS89Bms-iBDT#HxTMZeL&Pin&K6cJZqpbo0i@% zl2QHemW2i6#v{G*es<)3{Yir*&RcNf=SCRxhNW*mW@Bsa*PZw4k6=!X&&R0~&fqy- z=m%I6!EjiSNPRaoEYX_Ly3#z?1@6e_kzMI>19nEwP)r<{)$<6!N5rmj zVwUAdjt-o*yhPjy`7V{p@S&^rTy@o+$@wm$#o=`?oxWe4|G3Nhvzl@;WOgS z8vc++*v&}dvqE3sPp9(|fE?s20i0L}45L|P6JZxC6zt=2$kh(dv1&xszDS{sR4tQ= z%ew9QyHbp*5)+%CLKX4th#Vccf9s_CGcwvg_U6c@!9Sj#K6-aJe^^?d#Zc{TCI^>3L)$eK#};^5lU8(CAQC6Ma{B-xcb+k*q$x?=V9rbiGSl^#y(I zZt;$BH~*ggQ*qTp`rHSGr)Dd$SfpdxIA&Xom>`4lK;Ga$q`PC%207V-{MJFbbp<0B zB|9oTq@|<}fi|J>4cKsC!)EbY($V`5+|Pb8)&}X{&wF(Pf(^xg`cItEt4`LA5h_e> z2O?uZg^y_pB7gugJH|C->w)uLmFRANW2Em@_&_Wi*l>WojrM)+UGZBV{)vwVJx>tN zAx)TO<>a;|>~A7UmLxRu4QvLNSxduFx|#T-l;op*^#VJu8p*t;in;O~6BB zgF{MEDxDjlWkp*MH4@13G(-xxE*Ik2>7=bUq^RHFz)^5~DdOKfJR9-Mu!IY{rMLVM zE(DK#9i3{NS>gX zAp(nzkWt`eT%!WW?&VENB9|}3s5EY+Vfs7Q-K>9#S~lm#>)3`H_2l94Eqq;n_qtoq zKn*9?--v*XCoAy>!1+xs(2}0pmjFdaYGW9UL3-3As#wyPl@*%!;Bny22k>d785cf@ zbhYOz1S&lFD9o#Q8jc*kK%$I3rWQSt%9-ULU@es>@j)Ovv6^c{V2vNLV|g4$ zXL=wf^|IoHCNp$|&YN{7?;a!$6zOR_q5{Bq<-UsgOM?B`Z!MU8y zj`jliV55DYnh1*_*N9Ul=MGS0333MFpb}N#`*69e8WjX#fgk0u!zl{xN5w!d|3UJB zB4SehI`l!Z0gcMow~?np3)TXg5E1%O4|@+Onhwc)6+xC z7FJ=ELh(_N9+Z^lW==8H^Uv41Iqd*an* zlYTYr$}6HiQMbY6R`@AVrtgcT|ra4gKTFlLn zVAm!Jb~VSyD#GKBNO|K=J3_)qLx)5&Zzfsk+;K{)AZYEqU=+2r&`sR@%Q=BQbUEh*&PMN|?wt!2zE?C3FDLAZeVcSO!AG?bVgX{2D zv5~70fgOXL+=2M}A}T8LBD2t22{Y%ZK3+e;K$(nD_{dB3fMltLYW$C=)MGVP5L1^+ zQoZI;8$KQi;DI)Afd4&7)cYmxFSOGGaQR|#T?}1jZ2>{2hDDF@Kmum^Vt$MiD&uOy zph4Z^^YnwbvSRY@DxG&;sW3eED|dVac8o{x$dAa6peKSCP;ldiOmCF1YZ%8FBWg zx5IUpOIEgQJhpR-(&c~AXI361(s8?l^8u}InM!>nh-LVJDQ@qyj5bK?m=kKR7Q^$& z)Fx$LsyREriAJFbdAO7MB|J|DwV*2bQKZv@k>L_!Ggxmdgy1!}rVzf?A*1Yr>}CN3 zB#Ob*ip?uhsD8pOb3xpExZfWM`+w*U?_m8q_=dT*u=Vwu&wBh5g_&(OTlRoI=VFB%wwdS<0=0LouDekb3&R@zi zs2TOYQ||Y;%Ds42M?6jCY~jloeJP;;J-y?&^o^S!BSxyu<9R?d?EDX|{tD&*cmJqt zCHu*ECb}P9eynULRZD0xP&&Slas7bi(8xpZ#!B4eFmWgVA)tUs5KTZCLi_`91$>8d z9v;F#pOoi7pTo0hJWcd0Dc%Osn4|pJz4I$rjiEP_-Ge}sQLKji@j#9c;;Si?KkX01 z5=|{!wgM-`er+t(L{X}U*dJAE4ZDq8ZAd;&AU_$3Rv=-5s3ol12LV@5w~8-NzUA=j zttzja#2KDyQGsqmNbIvCbcOE3J7sI^HG~+6;xJ=;;NcJ(4GkQ603k*(Zz;9_cc9geb$EMrfZuz#kq7AcODK)>DIO4|cL z{v4!JwB4it20Uqt(WVodsz17$4)3N?f0O0`)f`I$128a4%mWyX@CzlfRH8A-AN5l~ z1R(ZC+fMV;i1?@6tT<}Ud&mt$_yL~VP?<% z+}oGh29Ig;wr!~shk*M*R&86eX4@(%nKgNiCwRW=Xx}P5LEh_VPbzIi_S)zik0YFd z^rw+I-jHhg2rim1$LTSKm=h=Ii@`(S`FjiGJpj=C5i^|dZ`6_rDyl;ri^DVhcO9nF+`LLxhAJT@1m+zLeY z0h>b<2zo@Y$|ypIb#oMcOfCn5)R7)849424EK9m(yLIYAoY6@u{RUf?;(p=x9tP@vctQN~Bnjo_K^ z5r()@gjJp!RHq1!tDzN~l%m3^N%I9VSd2gDpU2-n{;>R_d>U4gm~a)3a03SJ^{7=8 zsRBnLWqE^CkY$FMMTK;YdS&op6Ziwh*JQ+c7Xu-x*RMrLRrSI^(Hw9*Xl`^+;14?8 zC)karE>|h2*$^;m@ZQ5eXCb}=Mw;U9Bdx$F(L>(=X@eDb=EwzlUk z|NO7T!PRUk`iSv=Z~6ae?P`Ofy3X)@*98F)Q4tXo*AGDD!+rOA0f{J5gTzwXM6lK% zB7zDS!4DdnrY5n}8f(?0CK^qnX%nj!t+B*9Hcf2DwvOo}*0lNPbexRikBsd&X{Y04 zpwGGYS;fSD{K)Q}ecyBLInQ~|-RIuD_uO;dv)26Q9KCTQW$A`@o*9#zva0VXlVYx1 zZnw?!`Ddd?2HpDEm(7w+#(&i~I2kxGJkzWXgRU9djznBB+k?mknBfebfE5X{Uv@3& zy3-6CappF{*s;H_HS@W~jYmIYiTTfP*0QN~x8nZ70>KC4LKk!5#g9%|@tYenS%TZL zz8ig4;uf3l+66*~-Fxw$gAr%xqs`0|JU+pso4nyrFy<%EZUct4 znC^TGRmWb9?}|=$w^T(6Of5yBs+L4w$-{M-yOwkwbfqL#wYbg%Ye%J~SG8pKT`VjV zUv^7X#&}QDj75*d*FAKw(>=`XYB6mvq5Q@E8`~ZnR{9TXJnqKvdNVl@^LicGU);Yh z?gPxiF<#{DdmCsd7njlhxcyz+_jcR|Hj*h4dmWHoYl=Y|5HP#ZiMzI$lK43(1$WC* ziK2gIIEc78&gVMPY(rU7-X75G?!hQM8w;MI9Zb_tHyQzX`g@&lN8K?y#v#v2<~8|Q z#>#Zc8jrGeJ#Jv^gKo;1G{kM)$bsczcE#}TCS#cBCAwu(5ISr%-ZcAPft)a4+W?II zy+}9ZV`;k?UpF8vwk?L=jcrDc1#UO3}Nd`0|~!PSF%2473qo#;)hPu!i9lvI(_opgQ314DKUxtd&-+%t6S(Dg$Prxd5u zr)*7mf7qW=t5dsEFAq-{o;!T^h_n&)Bi0Cz(~5n=(&jUe5e5D=o{LH9u=h)~T$&W_>(1W$dD{hsItX=NtEW zc53$4?2pD*j(>jqYvZqY;yu$mm7X@w4$qAVD<_$T2?zOy>yp?$ur$nYSPU)Q*ntEwk+q94JoAXcP-z=yo*i(46@M=+0 z(axfq(~G?s-cy>ZkLX*z1YfVe-oGP|8F(S+4mJhPhSEceLnp&Y;rj5A@F$U)$jN9% zv^M&5^ipv~@si>##g|J8N;*saQaZD=x%B-R6*FEcOD&sQcBbt5J>Gkso#~ocKl5by z#PaU)zt7q{>tD0GXaBRJw4%OZzkT+457(5oj~MVo5a6gm;NSqisd){vPV*c$()gsn z6_>d2*w9*un4=4xl5e8!Lci@H>VwR+H+4692K%VTSsNupJ>Ck*G3p6cx_n4I5&BK) zL#)ZJRO-pl1Jp-Cucdz8N_WL<_^su2?cA_oL(z)WU2B?KmbJHa6fJ9S#i-48%-Qb3 zl|c*E^=!5}ah32gg3t0|#H=4$1GaiFbAPGT200J;*F!h?SD`1+1Me}b@ix~MF@z2~ zw%qE#>Q!rzdpVAVBFt8;#tH;AIE&wlTEA$`hi@GZVoOoF384k}D^O+u@~?mg`_*hqO74pFS){^GVg0`rcs^C`0lOU?u&~|U2Lo-Yv0LF-c-zuuGv-f|u^6tOX-BUMM z=3RvSy&Avr8vOn(w7LVS#{O12$LEn}AzIvk_L_ZSSmx}L`|S8_e)+JEJlIPSJOeNc zEXKYFAjRQh07s(z!pdFtBU2|f;QKusr!FxbXop%U7$*`Z@o;{XAc>MBLj==};nL6a z?GBd_*55FxH4UAr>3BexA!8&{vSch~`hOUa69KQZ4t% ze2lxUkuS*t`LcXP?uWykg;FbZvPixvi{)#wL>@FAdZa;?p-X?cG|37$rfiXwvPxD< ztF%eGtdWOgt#nAItdsS!K{iU4d|e)vP4W$SM7}AH%C}^*Jcj?2CuEC!Te{^tvQ@q- z+vG{vF5g3U)b}w^c$e&!r{rn*f$WiIn=9Fe1POnxdoavaldekLd772JvZTzchIIW51CGZ^)7R(>h3$*<&fc|*?0ujMyb z+zv~>%J1a&asge!7v)X)16Cq zNZSZVyK+doa!9*!NV{@K8)uGJ?Z!ab_>ja=;;7viq!Ukxr^Hj@De-*7^AXQSJRk9V z#Pbo)M?4?#e8lq+&rdu*@%+T|6VFdPKk@v;^ApccJU{UQ#0wBFK)e9)0>ldtFF?Ei z@dCsP5HCo)An}643lc9#ydd#{#0wHHNW38NLc|LZCq$eOaYDoi5hp~P5OG4p2@@ww zyTZf^6E94>F!92~3llF)yfE=1#ETFwLc9p^BE*XjFG9Qs@gl^F5HCu+DDk4iixMwN zyeRRa#EUw3O5Q7ZujIXYopMV4EBUYFzmoq-{ww*ftO8zVPujIdy|4RNV`LE=^ zlK)EnEBUYFzmoq-{ww*ftO8zVPujIdy|4RNV`Hv+t&3R&ulK)EnEBUYFzmoq- z{ww*ftO8zVPujIXw_e$O?d9UO>y#F|MkoQX7D|xTvy^{Az-Ya>pA%_o2{ww*f ztO8zVPujIdy|4RNV`LE=^lK)EnV@(LhUh-eben*C^B33F^`zzF+C&yytvzO0{|1%B6xsj) diff --git a/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.woff b/www/bootstrap-3.3.1/fonts/glyphicons-halflings-regular.woff deleted file mode 100644 index 8c54182aa5d4d1ab3c9171976b615c1dcb1dc187..0000000000000000000000000000000000000000 GIT binary patch literal 0 HcmV?d00001 literal 23320 zcmY&6mA1(8T6a0V( z7zzkXUYUXEN9+9I!ap!DFOd#1wlTB=0s{G=z_>rwLFyJd-Ppy62nY!Dzg$rNAC#b> zW_IQ_KN{(eU)_(Nsd6JjiMgTUPb}E#|M~#|A(>mdoBe3JKtOVEKtTU^2nd*oEldqf zfPj=PfBaZ}zy@NZ@n!KN0s$!#{qXEt`TP45!w50c8!{TL10RAG)dniu*zrR^LTrn}O+tRb0xd~0E&>H($0brSGJ*iX z8bUAslphEzmTHiWB72`anLv4VuEY~_ za}WVZu^zT;R-~y&T~BYSiJ>00^O~gpl9q$zHI%Y>Lhsr-MaOrb%y%q|(42pX<4bce z&%S(EIYGx}q8~@4pX*EKdS?h=SI&tEv`GGM8)AScL0;U}brn10v;~p2;1NOn2Um$W z*U=i%VuwBRz@Z11qKr(qgO8vr*&X5{?12dd{6*l`Yp`?k3MDcih%qI+g!qV2n61L{ zS-80y9H-NmrN`sSUC*p$lut-w`?nyb*goYXni_zf3okCBA{zrCwXDq^$DQB5U?DQ* z61o2X9r4;yA!5sN`)f6pe9e8pguH(cK5%0-vMf9zrWWth^A{_9wXmH0nW$}wo9hf@Mt&V*5m2_W0Zac{Bwl*3N0W}7D6V5mO|AbT zMePe7b5d1qntWOB)2(kfH3+1h@`qdCj$7%?Ws`6C=E;z?vBmFy(ZuU>?ZKAjdKnE_$3iyZHlp%_ z77-FteGS2x>7s==RC=EgNc20pi}B5ZYP?<*;Yn$7M)<7;<>9ljc|Q@}q1HAXA>?XX z{-<=FYU*8Yx_bmPn*eq|(6}#S=KV{`|BZ*Xn#BSEOxT0n<2%3UJglMVh`FJxT)N*_o6m(8iH0h%=F{CzZaZ8j3d^x{KT0bRC__^79ko z=tr+cA_{hBgbop+gr}pTjdh4lR9OGJYID{f-h7TdFVsTYrJ)sVL)@`Nes|mRJSCBQ z1vY;D{cTS=MKu(Wy%|e~Iy~QIi?KJEB~oXKHbERbMSWb} zZ$4oLo6Q7!JY7E&nSn99sadal3PMV~{548>MpAHY2H1T`ZcmF;%7p*Gd@)Z2X$V%V z$1bYU`a7{N-&8b(7EKxaD_#{2yNI&{t3rygLIQh8i%wdtQ^A4QWPw@AUkIZjStyRy zt6gfVP}$xz$w}4TO!~910gWc?ujr|I`%rxo*~ZRJj0)|c2kf0tbH}jLi*?h7#a}r#3UcIh%=Rq+9Oy<}9gOY2vy$@K}ixTio-4X=M1@9qI z^=K!qz=h?boc7!Dn&OoiZq*aBh4h7*kXhO z>pcXk->0DSLp`H8gAy`9imj3RrTwYMLn%~ax2R;y6z$S#bv?dXh$n!f{I%|F6CUzH zNglJr&iX(OdhO|M-zijiorLRikL!4b&v<-I;cb2U*9AhJqg6Km0|C@3UPi3VuIeHB zEvJkk^d768V;-U<9n39OEzwHebV z^!;=ohVM{+SKmNmc(fHuOajOg)eZg4gP9Z?_0r_5C&wd<_hxoo_+<48kwZJ{Y3kdj z-euRxbNtS4ORoUDw~*0{d?YbybVf*Z&j3f0Df|p6wtg}#){z60vHIVDYyvXYiqtw5fLstI@;wPh+Bd5ldW?|#AJXDCfR%eUYew_;&(+g6-=ThC?S3>8w7??8cY@rx zXANRWBOACbA6cC_l4+aF!&NSKMmjmK4PZoF7UG%C5 zf)X%cLC&;>^$NdUhi>}OaeOh-03Qt>c;rBMl8FXlh6u#+T;)aNQAM7iYm9MwQAwQ$ zauN?iXC->xfF|9A>Yn3rfOkVpm+8&z?LmtUcZTECdVP6@K8N`=NVn%wvgYT?wv(~@ zRQi1syDn_w+iAw6*B2j_C#*4Oa=3>>HsxLFzfc-lqHiBWPsG=v_Rqfna_4v6=XxDj zbWvX=bCj4jf>-mGLa)^qT)yEMN*AOa6}Y=z5r^W#5+eB*=NMYFLlxp|l;Umkrykmm z>1Pb@=d7ZMXh-p<@vNTD{%C%$y%YYN-VTD)5%>5QvQPlpLYJRSmulc?J zubo~#6g|MIS#tM^y?0~C`jU2#a#T$VEGW;6HZHFWLEd6C6gfhTw6Hw56Q8*V+~VWN z4AL!NdF6?QxaUpsR*ZThZ22BrG(+5-Ud8j`|8n^?HPZ7*MH$Y-GdTEy_<}Ip%UH`% zC_ybkuvZT`(*5-7zTSgt1y-AX_=4Vq{_y1PK|t=n8Jsz8N`x^1R#L(Hf(SZ(R}et= z20=K0`i!{GTB{~I3$HZ!fZ7PE0K3mgrlOj^=HLjmlzB{Q!INjU2`4JhvkVArhWI3g z2BFDRMNusx)0QK>n-{_BPLkO*tH?}~b^*t2 zL|B8@3a#it1GzFLG>-jntCpno1TF0OMs-3&ICPgAm$awK{?_0%(W?W=|3Ym<2B399 z6?sOv=odFeFq-4ZH~dK}*A#W0I_F%hOcy3B(B=(oS9N?rZK6R)u8SFgYl67%j$Vzn zT2com)G;k5ej>5&f(ldAjf;DQ6!5hOSn{C{3@HGgJfyHHbCwb;JWINl)t_@@KmMH+bk8Q`tU&fRBnQ(#)4NSadxDOZI(w zdDV`IZHTev{l3e|YJOjG)!*{Qd3Bbc-oK>W2LbR{;`&r7v=uuYN}Q!j?bR6qQf6%Z zD|U^HaP=Duw&<9^4wcHPM`Vo0d8#?cwduvt)W!CY2}SzBBsBVDmS^qNq)C$4z-w!v zu|}GDNU(nCqGP?m2nGh>so7Y#2jSAF;UD3l zTWTJlAQB4XoWDz=q%Vn+jEY#AwT@9A52;uB*W>Xje?f=`^s2DJ+s}6b zZHctO--vJs(vA6u2D!C~MMV%ZF_OWKERqY*L7bn~pu>emnX~};w>xKsx+HmlModD* zRe7jxvS`Tr6uHz_O`!|yld+VyK0FQd$icoJ&6I5J_C@tYl{!GM>wg8ezB^sMFG{SP z+~tO=8DM|68>>8kL{vLa+9stZVE2&^q(j&WrimlxADG12>h3l$)MnnoG~F+Q9%u&_RYNWV-S zu8Zij1T3udO7yF++y7qK8?@Qy;j&>d29gBr(=CZ4lKGZq^?3#ajS1CkdX7~BF>3+> zYZVG#qpmz`T?l5}q@jYe4}&tAuC*{c-?JynbwY*R0wc+;hotR!1CBsHEV}H{pEV_Q zQbs{v@#pEsI<-g|xh#rQJeXH}di`N|kNqjL$UE~3So5Z0bsl-UTxtBvq=J|gu+RPErd8o zq%Cu)1CPBz7A=EEzAUR|YC=IU9%hvt-M5s$vP}yYbrS8_xEfnDFCI~k&{z?w$lx zkHl$$>l6w9E<=%h&m}p0DcU+fGPM`d($iGo+S3fJhaypcIE2yU{5H<0HCgoFK{GLe zCVD+P9e_etX_H9_t6xc?c?>7@pb;TOf6%r&2oND`VL682Y@H zo9cs|v@$?BZbm;;TeI&1a|hDjryghe`LAHHYtRh=V`G;8&hH=u_R(Y1pv%n=LH^3^ zFkvIs>V~3aP^2c9bjt$HI!&KIsHF;<6GGV<&cs3&h&!7&F_0TJrW*V^F`?h4z4b9P z)shrVOIq;gnBtPE8xy|c?B+5Qhe9v=A{q0$_8i?gn>U-#3cMhdDV#r)gg$jBSHuwk zk}gryawT5)H|i8gP1CW0tGr3sKVvSH=C;mKYmExi&<#lKQbxbVfh72pcQ7oRvXB%= zj1OXzBoz0nqSwe)?dUE|N0dA`Jm0((=&k$p`L1c)=>Mo*a}LJx~+>;2tcjSh+G1pg5Y6PO}pj8+;DLXc4La-kzxi{dPSiJ7 z8JC>pyci_t`xsI3_*zD$W!*$<4tXVP|Lyd;LAI{(?h2Cw%dD@_;lH-jHe9S+i*4E z4mm+=yxP3;fjmRcM+tj5WK$Q-9_(!w&4?Zu{~+v=o|o`vvKeY_m&uw>iUOhrn)3ws&_6vxHpM+hCYx}osCc0Y-Tyq0z_HH?lw9s=QM+-Q{gQx~FocK9j!8!mtbNX&zBR0Xt$l zvErya$XNJ@m2B@ie45(Z(19?S0|j@Eej=zw0gE??YVlwp4LSl7VHUHoo|LraFf00W znbw<}e@IUzes(fu}n<{VdSNo|T`)7axnJ2E3 zGN-K>ywjN_qvqSYS+3(Tift}Ac+Th~V)w~#F13j;D~$iUE^?zyrm7R;K!FVAfwf4+ zgEe5#q65&2_@2P9Xi0@IzKKB$Mr=t77zjDw^ry*`L~i%3hjv^6l}?gMTjnmHPNyRD!RE? zVzeC>gkFuW>V5P|ms&5GT4O@NM-mhCx+a!f0)LQsDAs{!i(cE9Ov8j9Ot~S$SX^Tu zbvv@~cen9fE3YI>r2~|YyQVnWpZ-X~m^M6OE$L`m&MG`G=33X8DprYlBgvrAjN>#) zf7F5}TO}Od#i%Pvr08HxB1L|F7Lms;vt;^z`LYoE^HAlcM$*80N!_Nc@Z0C)>z37! zB*8pC&7s#0b$L(fb6zzb_{hxyz+_iYonkQLn|M^r48oOlXXt>e7{zFo03wLhcxL@> zruxmZD;ZM5U?3RR7ni`br#{#)H87#K@FBbE7!;=-Y}c+8!h3d5JExlz2JatQJ+?rH zEiUGqC0jaoW>(Evnh`H^?>C|E?;wdM>7y!8D4dVkC<+|T0zP?LNZT4#$T22k5m50< zzoALNpZ84Yo=WEiK^k;g##y>nq*73%RqJFJOX%P{Sin)USV69lwgt`-QDJjC{IgNf zBW4`*siNB=F5h|FpHc}mY9&H}jGvvlX!|~~dIc_J`?;(WsSic(jU>39iqS|Q7u!DA zY&kA%G@cdsQv^FWgQ+Nx#A;({7tI>&nigS1N0T`xz+mg6@_{zT%;E%P(``j&bsETN zs(q(bWF8KI1M_eY6S%3}4I-pbgJgDL2EYIzPp(Kd(4_CqWI0N zt8t_kb+H2&h#4kT$#q>Ac%Z2bj@0N+O;y@sWv$8hU9Zv@p#uT7sP~{kG6820-K~jc zzx+zAW+=CEi%kufkYzrAXi1hFg5D^8VfWJSQx~1y>x~0bBV$33&FY`a087m+i@@r# zv~L(PphOgimWm81wL^lXk96(eK$#U=hQ}pu<-Srb@X)RzEK4@vVL9cwNBv&D7`P0@ zqV@&7+T19`yV}oc>o1R%dLPHOtgykfkQ$mBKeZU*==5=O;{`t7RV`&nOFus5HWa@{ zXbhx+TZxRv=(Ko|DZe>7Tjhggvxn2ed0umrYSl8cq1^h1GLxv~Ovi$ld?|yHWQbL0 z!Ivh5s&TPz0K^%VfE05%mJqQKs?A%Hu%Xt@^>Aoa$L6|fp<>G;+%>slePPEnR_yRL zj;yc0lCyoP$Ic|g#bX(o<$00nsg*!S33aGHMx(FL1IZKmm2(3;)8v{BEh zq+0};_3dYnO)g&8rn2p~Esgh&5iy4}Tc`s#l(NQVP*B`-s(Tsgb%=E*x!`vNJk-`k z+fm(7Qcae_0=zlj<0~2F)s}a7tknTT`cdo_)g;9@CX6}Sx(tZ-vBXh9eV`-C^l3uT_&kk_ zy!QGr?i9qmGaJ`03`VTK^)eYd43pD#6!NwJr0B=zjQz5pDVIxqPspfGxc527cKuN} zM+02tzw?((Ojfsh0mh)!EsE8yz$@B*zv5LC{@~DSWie_CKtd_%3$Mw8a()p(IDD|g zE`aGjSXm`BggX|S0Iz8=DQwWq7Y>nH=l2gF6&gHY9=4{U@)*&>a5Lg$i6r`O!H}dD zW;VLr?c@ISTZz-X^w-r)NsJz*7Ik*4Ly0i!Bq{Zd;rF?m8fkO1OM@>WW%j&Gv#v`$ zQmZ$kLeIBScr38Jb@l%c_PQ|;xB~H7qh?jaoofQxl!Mou$divTfpW_5t{jt5n6rPK z!vRqg8v?Nc`M^e6lM(@2!!NA&BnKun1vVjc1z9YJv06oEUF=G;UtEZ%aSas1z8-O2 z9BC#xzszD?1bF!myHOXw5=A=9o9-@Lhm!h0YZ-|@A8@Y(+_Z-DK5aN{$p1>cump2t zD5Y<$oDGvcGH&@I&=`_@&z9%lM_#_W8iyXJa<&`Ydn;~#brX*PwN-j%3hf05d z4E%>Bj9t_c-iGDTJ%p5oMe%gVzvc6bd`PTb9cQF~$q=bA787VjPi04Chi`i>W<+{G zV&FRA7KPur^W&w!IseMOaI{i>RU}bnWQwl$BQA-{N7}-t4=-KVk!vbXQ}zLtKK~Vb zh}Ni+HS~8TjiAhC5SP%}5)++t1N`_`^O*%;^P^`Rj#KY=G1%z*MAySF&MiUH~wJ&BDU^kXcQH6%9!xbzqRA z*C;FT!ttCmLLmGAVU95En90d_(qX5~%fa`pstx}K4cq`D|L4WUM|^?pXIDSM7j{_` z3G3~Fb+5YFcta__mAzP+vqYM1(W%@8)d!*dz-)tf@tMWp!rn*|T0x9DwQmg`{~HF^ z(&{06L_~x$VO)QgY!}xSiz9L|mX(gredtzS?t3cy_RjmTIU(u5dB$Pw+b^CLxKo!Kal-ql57+p#JJ3zg*_!Lh#CTQlhLZaSdUpir$y9?7cH^D{5SFz4E4#R}~cZf9Y7m zo;9Cm&MV)C>%p+!bv-*M+$WJVT;|RqRPchoQ_7BbK-|yWM-<~FecpFY< z*+V%yqBEN@TuW|VvPKxu;wzn6PE#vLx(^m2Npl0_=R`(f{eE#>@hhO=C}MNbxWW_v z>i*?56p5poIt)%$`T(F>Fbvwm_u72fIj{*&-QjYl(EG&}&x2XCp-|gm&6LNw(*^~r z(;e^7)q{$HCsydP(lnZ{CMFoZw`Di*O0teoyeuOUSTp1qVs*`Z9<21;EeAe2nsvN~ zRC6*s$3cgHx807}TdF!K-J0iGN^SO{w>QZ;&Y$k3Kg?6j$YHFGxQg*a{%}-aq4xqy z&jBywOH07(H!X%N)*9k*pouLg-u)|*fP*&bSExgq7b56vts%pZKc$!0Wz)kTr{n^c zH0~1dFP!u<3h8{HY$Lt50id%$jqN@8k8{VALlSz2UVh`a-#R#>zHXSNNR|{7e9pN> z7TX5KSq#wFmVO-1xo)>HN)vR#Rlnv;&}%R75X^KT9xE{?m|>iz_BH-9O;l0+ZPl<= zgateSH#Dy&8cL!Z-sT5hq(D<^FoqY@mUzl=C-x$j>?y7nvAexvXwZ#MsHgqBZp zatbN4V_H3K-L2vU@+EGATIm6Ap`GU7lnAV|6g`8C(61y*zDel%2}VNAy1~`blPHN= zu~bPszDZI*Nw!P&qvtzvpA@&tGdJu;DIn1jLdX; z)t`xZwPI`TdB?s+nt}J71mU}hawwEbPnX$OL8-5nO5zHu%kT?MIW=*XjkB-H;p1>i zcVuPz(G&BP?D09Rzm-PH5sJ;n5|jQEen*(AWy!9%8%FrobT2yz?d&1r2KSS&4>U<6 zI`!cdm9dC1Hqn|R>+xX&B?|~3hd5zh)13!mfVsLczdYF0Z^iL|oZ=M%0c8`h0j{;h z%1hkP*~06j7+rI@eA;#HV5_3yPVSKp^*V2eP_Sfgqg3u-*%?R0LP3RyTYh<}z$74T zm;u}KQ$iP(LarIp;*m~l_iNZU>-f~@+~!>SGMv8xF)qs2Y$b}ymmJp+*51+kk=cjL zmrRQpnwbhoGj^9~t(5N((?x;Acs$~9zAnWpC^CsfbL2PPH_JB*;3Rr>5>gypdKu}@ z_u^!zU-oM)A~Rv>w@^Qe=A>t8Iv^I5(_hL|C*0994Dztje1-tP3-Ei}#z%jPDdt{8 zyj~NQD-NaTJp#iw;$eW^b71W?UD@s5BzgyHwZ@1vXRIB(t^Jc6R_Dv)Hs|F8qoLtu zkC$6KPc3aY4^Z{pf-Y8+AhHwBfE}WYF<334Vo!l}AXb%trV`AC8!T6My>xRvk#pm3 zHHM+JX=1+RLngN;k-3IQ<#A5MJ7DB2=>^LqDb1%kc#Q5A6%d%>IN;UIK4n-`2>D{q z6jHM}#0~z-%3!K9@Y#+aN0N<0nV7!}Yjdma*li{=yZCa;H1McT5{GWCXe?F`+{8IZy5ljQQS zrTFrqEl5LQ6y%wNh;`4Sr5J9RFfaH9Na!?n-MFD%$2Vk4(|tbc=g}P52_RgNSWcn3t)I333gCka0q_DoXC$EE|u?la)3Hi z^Oqsl%8F|h!WfxtA3&}E0KOg)%}(*;8p7JP~oIr7x~qr5ZS zt}-eG#D;|kb-q_a=YwMke!SFlTUXIIIyhgBr@r1$`M=v573zGUZ&Z;ovB#T+9BM0n zr7D53GV;cMPnitw@6~l#XLgD-r1|n4y?bO!UcEc(qc7(MCKr0=6j!>Gfu7UOSM}Wr zrxrvQMB^yRGbu2{3OLrjP=6`>V`nK;{YAu2$`B8FPF$7gZq2ZawtwRV0kK!LeuHJz zBRuR2nG8L&T7&sF(BmF^9-`K%l-a6BxnQhEsSCcMv@ca`7C+N|8~^)`NY6R>9&v-F zrSt9am3)7()aGkIp=6JF|$3I0`=vgS2}W>J>gIe0La)`lZ1P z{l;udc}QmIM(7D`(wZl?Lb}i=W9(rVd}caMm3YX@2^XEe7&6ov>SA_Ul!YAv^tDYe z*R}KK;n3W|(DgTksHFp3@6t-fBvNI)YrjgMY^JK*K9SzP;OKf3rVT zZIRx%tWtOEFkX+LaNh*i3kxphn^$o6AR{?)Vf=48wJF#hmJAL{4=%^PHvR5{s~IP{ zw@K5SuH&}_b#waDN@Dr*1#;8 zj3>L`zy2mj!ymgpko;mUZsF9%+di@q6&^JI&CNM|2-W!Zeqx=@JCWw~Na&^Xr+cBx zD~Z_rhQn8JeQezgl~_%EHY<}DHhMelQ2W>38M}*g^5Ct4+hNyYc-PQrKYdKg5LHHH z5W7c4sF^;~J5~Mpel;s1wg&NA+sZYw=yb=+oocgx@pdsA=k7k;S&^0Ye2PKV+jA=J z%kv8!s;L>%L)sb~z5JD`X-KkMJ5d1~ffCHpybzHPuu8Wkh9i;1AKMAU1s;ZClWgMl z9P`0tCm%NxKJ+&MOk+0dFd)syx<+DEDBOC1G?twC@TmJP@Pf+(*wj=;G#0iQZJ(iJ zhG-xA3G|5*R@}e@#7hh_*PQ0J_Ka#hcc~Q+8mb_($57A2Z^ikOt#!vf@PA|k3?1E5 z^UZ$&A+KqZAMh0`O@?fzgWeM%dCVoQ%|~*CFOh+?GLu=z8cs0Doi&=R*WpzS47aux zHba&$jRt-gFb4(L@D#uGjmM|c$++VCtQCqFUas=KKW6lql}beIi}Ay+xI^LtKc@0l zdkQ#o-z()ZN*r?{x*<KqloOmbT5w&V zwbjn3a$Q(Enfrp$2j4p_eha~MoJ&}&iUWxSZ!8q_P97wWkI`RGWaL1RonK|Uak^P; z{w86F#atZuy~}Jq{ejUdkdpr)fS;-)D&h^{m;kRv&q0P&gY>_Wn_t;WSnIeQ`eb z%#)mE*~XX(4i>^EwvF2`&wtc>49nS`qmL5rVz_@uPo?s)>dW#p*sb5eNQ$qmB5fE7 zIKEk*|9H&Y!}-D4T&BI9rH|YQxZHIugY!WQFWiyQn?n9k3;PL8)U< z#A$~V3iae6z(8e(o%*Jz6x-yjLA3G>j@cDD{8TQFa@~$UQzl;@bJcoH%=3~W6|DQs z(HWs+Dv4k7d(U{^^k~iOA&FEyEHm?ov{QGSJr>~ zNBu!tDZKyZ{}g5cj*I*BSypu7bHuIB>1sJ{JNP717@@1r>7Y4r23)bUfoFRm^)9*) zCp9u|gQ?d{lA>+D7QCSr-=sytp!RCmlefdPbI3o?<*$WGQBXkp!Cmif{c*L*AGg&b z?7DWdx+ZbqK6&wh=w7UbYfJvH%6U0zyA-;}t7CBq?(%dq3th6bFl7)PLYI4xVL;II zyHxo?4$HrM`P6?8Tvl|24X-t54n_i-h0-n0Sl27fDZZL8HpAEcQr6*yVHCb~N7E27 zmK=cCh>pD6WTW;ikgkvgiM7ROCf}QC3cT(BH$oGu-0t^8PgZ6MX?z=8Lz0ne4T4^V z-thAcyiPMh&#zu3J_ES$FBkO~$SuMt-s!u@48@57H?*$e8Pwbi2Yrp3CQGtR8@!yj zUk8vkyy#dDr0sf^D6wod7j5Ylf6w`wCmvcUyN^|w?dyUD_KL31 zE~V1>J!2e)z`E#xwN&7d0=DYa2DB6pQ4$wj;@8aSM@4AZA{vjr3qxAHqrY=7T1`94 z_r7;6x{PXo9hdnJ!N8{tBM9uaKE8=KN-T_n=P(rOra}Vi)`j2v%gIZ{7+g3|lAtj* zB}}a4stt3~a*NENyqPR5c(%njgkzR6v4J&RA53RN_zXRj1VRWa@ngnMMCvLZvQ@+s}}=U?P|DLxeem<(Nuv7p63NlkA7!CE10D3wO$!ANw9 zObXX`YL=R6%2TeGd1?xrLK$VEwP`qN7HPlo`MM}dK3I_H9Mzu;W}$)%JINEGUpF90 z#}mTOLB17SWhL}ZMRGTaFgmU`2O4g(>;@kprlF*Cp)kpy38(i>~14$R3s?6^?3 z(HgVQFov4jM7QWqadph`*vm$aIIXJNNcy|m2$G|ntBgb!GwWC48iMztD|o=(>;15q z{$%3Oyvm9@O`4JoB64cJ6IF%XU*;BiuoJW(Z#j^UH$l#9HR{Mm7GhSUp-f9TbS(>+ z=TBhELjbeJW#KE%-tr3Zh`nd{*Z|1O0F`(MTCf5%G2HfRAaIr0SmvO)Tb5xAR`)IS zDJQ*_aT_PknaBS3@{3I7may&O+zm8(y_ea0+%G2M5N-*A7TFy3Ev_pPhhj93^hy2p zsf~STscg0VHv6)-suJJ_HvfhYQrC_Zn#OPKnOTJx| zt$bef1E2v24uA^CoX;uvbNr#<^;$Bn%#1V#=IB2G9-e7lqg49ji0~i?uStqONO;%fa+^ReCL3RZjio@nXo^g1nNPbwp1HNQV$> z1@gTfZyF)87$l6~%5yxJnEQ+ie9+G%;f-}&?6HbOe(kPIzzE$iqX`vfok4&ai`W-d zwC99WD{QBt=6MXVD;D962#XX?i!3ihIshIg{q>fXgAMys=@kLkS%9d+mfwd@#_C~~ zWK@5#ngAyP8WOs%@7M-tVjQG={`OIT#6O?~USMV}Aqz>h#^!wFb!x$Ak5eY`gw_Il z+T)(XzI$10nIxlz0YQ2v4bhDugbSQ_y@s>>rHp1+Svi2@-tSsqlpIzzPTyUJ4&6Wg z8t%*#w>(z0UiMXQELXctsZ9~k5wCOwHVp$8E;=11PHAtA3;??YDwCu|jO0#YA&u$Y zH5r8Whl=eb)AhDqcB?eTs5~8M?tF{1{8~NvkvAAqv1XpE@W8WAi4NlSL<2eyn*gM< z`9H|9_I|T^m{J0!3b3`LzciFAtd2LRu7s*s_Jsb0!7S+S7aJc*lt;`*gA-fKO8ArY zhA?VR7)jaRX;6nU@n|8Tf?%{mBM3tZ{xr8|dm^KZpSP}F*K>^y1+c#*N_x*PnQV4j zHXXs6C)_oV)=7T8wRg}#7y$*Oxzi|WxACj3t`$g+Hqob;^h}z0MYNO*)*)W%TP2K^ z8+E9AzoFgl+*G|4FIloWVp$TG!&6mGHAR&+;NTh5J^p6y6{5nltCkJrWQ|oU6qW*h zPfOY$qZTp;a(A%n4fddVdJyiB=7!MR^#1%L6Aw9d{;jcxYG!qJqe2pMrVyVhg_AWH zCaVB55F%KKa5^A)lmMTPG=x(hh32&U*SA$xDMyd3{ZPxizi!QSz5K)*82;WGBaTay zHDeWU8ME{rnLTO@q8U-xW(Oe4ST5z)w)yoW?X}$W+~i-yIXAq7T_olt03# zG2Gu}eml^<1&ha=qIj=`nCg>Wm_0+Cwd6oS*LRkQkSgAw;gvpLKW`3noP`D1=r5(` zPz>bAt@<5_%*bgTP#IghY!XJ=NFJ98zDt@(K^*}B$ts!PZjYpvq%tq5kYKLcJ@r)h zpjGeWgspjG$}U5I3;E(wFu-T*ttBj99nkVSJy04B*>3M>M=4CJBW{W+wr zmo8Lbm?dVE#ijL><;n9dCt|#Od|9HFF4#}Y<2rV})IKejs~q4`MWlQNc41Kjp$r;F zAUY8dDHmc{hLF%=Kik+j1W{WEZP4aaE0T_9G2k3)50J+n4@!F~;6Mm#3~zA2!(uNW zD?3~9!k5Ezu$*P; z0Z-5cF&^e2ZT=G7;H2(U6=DL_gI^{}SNj?dg8|^Sxt0p`cq^jwVM;7!Xjm8d4}Ns& zKcd#kpeC&YrVPU?^63<(P>{Ui+6jp;gFDhm^1pecu3C8b+kR_Tdy{IMWKB?1fmzJA zRrWbi2iAWJf`OWX5*Mgp>n7+MnqV+8M&DPEmPa?H%ZJ7^zBIqoh9?*U3kCchz3T<( z{o=DphBZPs)&O&+xL<}PTrSUw@BBJF-j`J7B@go*T)LO-j{0ZZpPSq}+fSEg4@}1L zZ8|B8jgb2gyHh2Popw{~EdhN#pk1m(0#ygca8F4f!i2@Brzr~+t!U)sEME!yD(7c} zHIM`C5Sn4OHuPfASSw^KEK{5G&ZKT-udhQ|yIrv`02n2nEE6 zJaaj=cYtkxDp%*vn;v7!mw#(ERHUI8&%?XwWWwd^?J-?@A*9kw-cvd2{8XJT$}8H$!5 z(CR70IjoaC>DD~Sdvbq8(GW$Ab&QVqs>5qM-s&(pM zPqqe9RFj;kYc-8w?^V+V%7{u54k`7Ve?+hh+r~`oRnKXVB3p_X{b-SP*}HtZ{G!PA zYJH&DPN4_-LI0Qq?XoMhMUDvc#~1H5z9hRdmx!A;m8^?6m~Y-#b1hlP<)Eq8U>?U? zbrG~tojEl{f3~|C?x{5NaaOUOJ;yJ2hOz;`4;z|OgBGHrpdB>_F3<8WI*%OHZMd3j zy2oRMzZ)xk)fy^F3L0R20hg0paZ$rdG{I|!)H%|BW%n4OCnFJO{@5hlKEt@{ZF)bo zm3&_P62l@ToZ9vsZl7rqgY|j&J=M}0aCXo$QWJ`uVjhB(*uS+H^UDM}9(ER4+JpW&Q9Bny4m*?YQ~L|5@IZr?xwVdan$7a%9{gv7nROdai@`14 zG+-^|Z})4_OtE~I#aE~AS0(LCtNXU(!?C{8pLWYD$$@TV2HsDljoVJZ)B}69$9)?5 ziNy=R_Yv5a^;THLpxNLO zy{q2MTR&jkfAcY;d3}8rjNG3Cyi-4GYlGzJkoOXtWoKd{@;N{&Tdn@M?Y}BW7UX`* zGLMt1)|BC45~;O zYEbYSZ2{~+yv)QlkAVg?M_pjZ-!GCpjqn>zMaydQ%*lyE0`=2E_1o>1!sJ380i_My zB})!KN8vNL^sR*WbvXhjt`v!TIljZl+nd*r_Ksa?e3=XQf1O-aR2;mzg<{2Bixzj6 z!AsHN?hb=%ahKw5#bL1GFgQgEgBN$VL0hCa#pd##a~|%x_wD3M@@21YV9+3{YvzBcTXYf<5#f zw@nazWj_=%=H(>O2QSy@P=u8`{8`_bk}x;!P%>I-jlqoScuG}=Yua=oBl+#ICF~F+ znS@$6yzx^4vw5R$n+4Gep@PYrOxf{U!b#0SW0W|~0Cd`pgH+d9 zHF2Y}rq%oV6;IeW|n{J_U0dOcSD`AWh!D^dDYCb*c8^ladlx6e8v=7}U zpGCJ-DErivDK7O9PLYZ!KW$fh`Bl7Ghke)_A2^fB_mP3$@dtVOu4PdD;J9^%pt#r7 z9aUCSF@MAA8f69~*msmp;gomRMsbEyIuir9mRT;mS7@#2U>)4Yq%WOoTL5&hULy8K z>kDnMX|3fn-RNuw(0Sen*8dtIY+Cz>5U7I^6VXeO{2jLdd$q><>Xl&1Vu0p7fs&1| z$PbIJ`zdYzEI~m!7&#%G%tX&h5*}N*sl~^UqaR>nhkNBS8AZM}wh=ZX zrjv;)`|w%_y2#qZAId_YsddV+wJ2*du<$W+5t&FUFZk{rEi3ntr&SUnt|%1C=Jd5_ ze_CF4u9zeMdmT+erqTwwyjqRMS zXmyK_a6D!#O9m>R+q5u*q)F~4F&iq;iKuj7YDjg=gR!K0M@3p&cI+#a>do7bc+EFf zp}{hAArKj;X%SHZ6D9Rz4`|SSmahv#VAGy11cXaX)Mt;d8M1&}1|-hAvZVNiXA6o< z6cfy5!JL;QBlt}Ru*oAMLs~|FY5`ga72TPzIc9tZFpU~37kdem-*}k9(J*PIpJJ^J zsSU)i+YsOesy~Wy%t%w6zMqz(_qC;@@v>^vIJuyqXhxU}irkNHR{VlcZHy_J-_{`! z{(i{Z^`o?+;-T}NH3_eik^=@7nJ{&KH>NC>I8$+d06Es1h|Pqo^o{1;)^}_EW(|57 zyJj+53*y)m6e5F~AR#?Ia_O;t0+cCf@_;lqd9@>cWM%$cNkbgsDZ7Cp`OsmBv5a=TQADA0^??l-fO1^j=fqzmv>$Ik zsF<+b%&B*pk!HX9Wifnau{En>S<+**we#g+tIq++C!fFshl@IZ%_AS&j%yNkj=w#j zV1zL4>BCBv?8m!_A8vU5w_+jRJAUa*K$Sh=>u;o)@%gZm(Hl#>>H9yA=VDeWW`zerl}&-1icy~%Cs2WRZT1JiK;)SUZQ>Vwq?HIZ#4y{7%`Ht@uU9-2mT?U8mz zC94OXy-c}dfYYZ@TnK!7OnYwUnU#=S)k-Tj1Py{Y_*g>!$igUn_8Hg?Yd`YAZ|zO)ET;+xY)CD|&4M8hSGJ5rwlLozN)`xJkphmTWhnkH7R zp|GN?86tSl;KdX2OoQGhRYBxMNYX@MpSn5D7F}DSPf1*q`Ib#*a4Jg@qHh z`7qyVkKaMCcRemWNY651aHvi)Dt;N!*0nRH%gv3csv7=?{>O*|2rMzztJ4FC53iHh~I24S*ZN8u3B45qTO2k zV#a%2-hio? zIFEIohf8EYWRDv0QIK6XdRv9JD+t>+-4?eH^&08HLs(EaIj}>ufdPG-&FK`ox(hP) zSX*Zqbos^?mzT7`kU=2R(_sFto#;e1-jS!3{wMk2OMcoJ>~6zIk%mvT-Jh7Kvbt$B z8|rO?J^g2Xr^H3M{Vu`P<)l*|Vr*E1X<+$j`p8kgt6ScMbN952xjmdzc;`UuBmU19zH1 zdQm<7)we%}!ruutZS5wmd;bx?EJ416t*z8Mi{3Jr!!9It;_W3U$&c}W?2NupfPAbz zaEvS>tF=;!K5Ao~-wL{`AaKW`2vX9W!v);+3Ne%UcVx zb;L=lm)%rYtA=x^cwa@f^IsmG_fHBMF!yLCJ+BFOHR>7stJd)?=Nxz%8iP-Ve6eSZD~t{%G|HvhpWj*; za3=~ov&HyCmD2vW$N+mUE$10$G3&6M?QY&iR^o`>Vh|lw=YCxOOE?w`X@(U<9Y7~6 z)Fcq!<`YOUk`P*#e17Azvnu6Onjf2;iYsll!t!`CbngkGOAaC^m4^RW((d+S-n)L~ zTM!mauKzQ?74*h_S1@6)A_2|}RmHj8#A&~vV*Vg@W*Y<^Q_2%(ZD@hdlKyCe zl)xetJ8!pZ#}qf;Cj>*iNq*>30qx?euIoKYV8uSrbVuX;KB~UnQ#KvGL+w`BNcSS1 z;U~2{1T}vKDOh?GjZqA^@8P+OEsh={qVYmQ$vY&4jYp=IpNGGesr;aBWx6o41JoSQ z(}BH4cv2?sB~?BFm6;E1bvk7aC#n*P%Oi?dG5L^1-hlm5(P&r2+cnG+!{_XV`;L8< zl|p)Pedy^d3gl4Zq{eg%;hsN&VW1 z*YjjpggMwY-|~3Adr8jW^cl@Ov{4xMvHHP;dHlW{U@^uuI}B#!zEBT+oebadmu;(T zo?I5REG^zcKLB?tC^&z^j$_l$2Lu>djULQa(#{(k8C0@jcH@Y5plQC>XSdZR<%2Fn zC1CnY9?x1zI@i^uFuX5uMtLaq!#%??TkQR2I!ifI;x}j8 zfr`BP^Q6sA8vDu}yITqBe`9jn(s4p+U@XAi4YXGwT!~ej6K_%!Fo)U1FJx5?IX7s? znI|z&$~=$$T+LNGw@LY9(K6|S?R%;K9(2@!slJPxmJQWG-*CpPI!DGkfnTM3=U`@k zo*N7*koGrw`pli4^pJpjgSMLFVm&}>!aSM4cPn7hzsL14QkK>UK(EW*q=T~B>6G2r z3kc0PU=Gmf_i1!^$IwY;XsZc*z39uQZd1T0?3v{XK|jR#Tw@inoudHrzw!~8x`ZUL zP>9mhb4GJ95$7l35USY0dK*R}JR4u>ysHdTTaV{r`q%*N4gv7}Dp8PMMD8}ve;U>< zz?5tAj*Jp>e1)7Dm#5|^+uIQ)R zX62|+|J^j_h#O};zES66?fadp5IKr-?2tmw=@pHfATcp)iM6Rfhw?q^hF;g%B>Ngy zio;8u$*OB7`R;LZ8jGhZ+?gbNu(sYscLxZv$G)#thMhWlfXW2Q$W_rJ(Q!NDXH0+x zQ3s->rPUy=JY3Vfy|$uMz(uPW}@g0hNlv$ z8ijAn!zVyZm6Y}Z3dOh3D#DU@xDFGReL@V#ku=QZMao^QT&DAIy!9xSy^UP-`SW&!tYS7JG zFuK6m-6-0VSp-+>X2;maXQ{4IlvcA2;7P8*nSegnv|P;nf$F9NvbhM?*;a6o)S^Gb z(#qjN-*PB$lw~&sFU;|DeLP1Jbw(%3@f$Qif%2~O;`X-ZWzTE(*kP+j%s0<2)Gc{o zZK-afhs+SDT!8Ina4zgiAp9*+$_7H7)cTEKJW8+e^gJKxMz$6cypGY^89fs|HazKi z9n3p~+HR|@$_yMOa9sUnF;{1K)uoFj5JlS{O;LE*{bHusUdI3Tf@H8^QTqikAog%~ zKpdW@gb&u4i17=8{|9yEsYL~NCnUb3#Jq@Qp#7zhik~?7U0OP-<_c7yiHiuw$`g5h z4Dk+W4~Sojj=p;}luTuL6Lg+6F>9i|YRt#X8cuo(eUrk>Z>~;aJ7ZEaCnWA`MdBc) zfcc&Z3TO&v%@gFl5^ijq;B^ zvz8RN(2l6Y91W9g(>MrZChD2F_&#rCv~!t_YmXK2dn;Sfp`KiR*b4t{fjQf3Q%`r#62E zj5SJx>6Fh)rVp`o2&;!MR!DuBI_q1wKrBVwev-|v@UfT;AjKp)rCR(I^k*jgDeg(( zdIc?W4ny#lvCc_WrNwMjR|zJNNMLrso)T%|FFxc4pSXieYJ+Job9`0RJB;*H!b0G7 zyjcJul}ATXgRQD@Yuqc@Nx`3oT8^GKT7Y2wB1^J~i?05JS~|{5gv0O!nY8;jhq0iY zVPoNDo!<0;UZgQ{97H7O8$7r_f}$GyC*2ad(Cb5O_SsS6e2xlbCFI@169mKacNBKf zncO?#D0m>Z?KHU#0TyrHUQLXd?I=E6L`*jy4f(hrAVIealGr`&NqObgCPsaV$ z8;05!V_^4BID!xGSMV_+$cnGE^*&HvV`wNmYWa_4B{2+)8oakTZumHz++1AiUv>v2 z#nF>*L#C+#6)*VlrjjSHLTcbM41+%nJ9?1D{^dNxjG)t8k0`ncWIu@OM^XynqfH0G z=WwG`Md9|NH0e)Y7u}|NWi1mh^%BJSW&Nd4yG7L! zA@u}#ogp?Nh4ArWVO%kyr}loh$H1|nzQ_RWz(EfYHvCCq4=quN)z(Gd%sNZ1qRFGv z^hc>BnG`qrT+|>4Uw)fXDcX!5DHZN5M4oHh9*!Q7CqcvjL}A1_)JxPVR25u2+)p?i^lS|4 zjQzB!bd8Ey${wkDsmttcR2Kpl#CSw_%6N}-o^&?yFDaL)RVk|sp31*snxmUTn+rX1 zuLX`#W=*Z`t%|L_j&!B*r;5=rQZLcp$!;nKg+9Uml|yqxGeC1j^F_la5N8H5Q>wdb z2p1WZcd5uoTc?ikYU3_oEdZ)=wYDl{Dm^PsHT{bw%L~eaR3K8cGL})_vJVJrMQa6D zNmp~5gOA&f#-}&RAC)+jT~aqW16dJJ!<{1SBRwNC-+@s#0J0xpc8U*({ev?ecGPiyM}y+{LPI^Pz?Ji3a8#5efn?b(KWc-fBU|^ znzO>c4x)cqC;rQm)MvF;V?w20k|d9a4=;gCLFjI~FAkIXegCKr4lG7?rbLS=Ln@|L z3$L)>=Fje6xLl#+7Nq=-S)MTw-AEsaotO9R?|`NzO}OzLB(ed{M5IYv+ZmE2)-yjn z2;LdNB6l201nn}Usb78XPvsv(=a!oOv=Mt%G*z0SZdP*I7d0QUxQDKO-T~4G=ztAc z@B5-Vu`Zg*ttfNbRp&NiZ?^jV+^pKthCKh^v*imA8R6#*MAthXKqK*C3<_ro+!3&|sV3VO#qfx35<~sF#wVm#wXr zv7ndFub0-Mm+PsQd81c|xtyG^oTa>+{`$UVUrwz(!b9^**P7>RzFx_3TK;;vTtKm$ zGI}yV@QugpOa4lP@k+wRO1RicT=z;;;7ZanAOryr9S->N5fBdngwX{r(}c7_!*5CkfA>g#46{`oCAdW=8fv-O$1Et7)?S0IJTuYb}cw|G&rE{b=#ln zcJ1qS4CYi+WlZDI*ue}(LFN#t^cb$&^Ceg#i;iA!~bT6jrXc!gwoNoab7xphgg zb%h{ti7#=5-h273_iFgwj`wgXy8!hHIC13FsTn2m{qdX#eajU}YW!4kITQvWO?tT;Vf8g(x{~xTU8MmMO%erSx?CP6!SO0-5{u$k4 zCf4#NV_{_?ECrJF}4UgOzZ`I+?ZFg9Uc||hEIS~1iw|&Yk-GO)NhbQ mX4Rts (this.$items.length - 1) || pos < 0) return - - if (this.sliding) return this.$element.one('slid.bs.carousel', function () { that.to(pos) }) // yes, "slid" - if (activeIndex == pos) return this.pause().cycle() - - return this.slide(pos > activeIndex ? 'next' : 'prev', this.$items.eq(pos)) - } - - Carousel.prototype.pause = function (e) { - e || (this.paused = true) - - if (this.$element.find('.next, .prev').length && $.support.transition) { - this.$element.trigger($.support.transition.end) - this.cycle(true) - } - - this.interval = clearInterval(this.interval) - - return this - } - - Carousel.prototype.next = function () { - if (this.sliding) return - return this.slide('next') - } - - Carousel.prototype.prev = function () { - if (this.sliding) return - return this.slide('prev') - } - - Carousel.prototype.slide = function (type, next) { - var $active = this.$element.find('.item.active') - var $next = next || this.getItemForDirection(type, $active) - var isCycling = this.interval - var direction = type == 'next' ? 'left' : 'right' - var fallback = type == 'next' ? 'first' : 'last' - var that = this - - if (!$next.length) { - if (!this.options.wrap) return - $next = this.$element.find('.item')[fallback]() - } - - if ($next.hasClass('active')) return (this.sliding = false) - - var relatedTarget = $next[0] - var slideEvent = $.Event('slide.bs.carousel', { - relatedTarget: relatedTarget, - direction: direction - }) - this.$element.trigger(slideEvent) - if (slideEvent.isDefaultPrevented()) return - - this.sliding = true - - isCycling && this.pause() - - if (this.$indicators.length) { - this.$indicators.find('.active').removeClass('active') - var $nextIndicator = $(this.$indicators.children()[this.getItemIndex($next)]) - $nextIndicator && $nextIndicator.addClass('active') - } - - var slidEvent = $.Event('slid.bs.carousel', { relatedTarget: relatedTarget, direction: direction }) // yes, "slid" - if ($.support.transition && this.$element.hasClass('slide')) { - $next.addClass(type) - $next[0].offsetWidth // force reflow - $active.addClass(direction) - $next.addClass(direction) - $active - .one('bsTransitionEnd', function () { - $next.removeClass([type, direction].join(' ')).addClass('active') - $active.removeClass(['active', direction].join(' ')) - that.sliding = false - setTimeout(function () { - that.$element.trigger(slidEvent) - }, 0) - }) - .emulateTransitionEnd(Carousel.TRANSITION_DURATION) - } else { - $active.removeClass('active') - $next.addClass('active') - this.sliding = false - this.$element.trigger(slidEvent) - } - - isCycling && this.cycle() - - return this - } - - - // CAROUSEL PLUGIN DEFINITION - // ========================== - - function Plugin(option) { - return this.each(function () { - var $this = $(this) - var data = $this.data('bs.carousel') - var options = $.extend({}, Carousel.DEFAULTS, $this.data(), typeof option == 'object' && option) - var action = typeof option == 'string' ? option : options.slide - - if (!data) $this.data('bs.carousel', (data = new Carousel(this, options))) - if (typeof option == 'number') data.to(option) - else if (action) data[action]() - else if (options.interval) data.pause().cycle() - }) - } - - var old = $.fn.carousel - - $.fn.carousel = Plugin - $.fn.carousel.Constructor = Carousel - - - // CAROUSEL NO CONFLICT - // ==================== - - $.fn.carousel.noConflict = function () { - $.fn.carousel = old - return this - } - - - // CAROUSEL DATA-API - // ================= - - var clickHandler = function (e) { - var href - var $this = $(this) - var $target = $($this.attr('data-target') || (href = $this.attr('href')) && href.replace(/.*(?=#[^\s]+$)/, '')) // strip for ie7 - if (!$target.hasClass('carousel')) return - var options = $.extend({}, $target.data(), $this.data()) - var slideIndex = $this.attr('data-slide-to') - if (slideIndex) options.interval = false - - Plugin.call($target, options) - - if (slideIndex) { - $target.data('bs.carousel').to(slideIndex) - } - - e.preventDefault() - } - - $(document) - .on('click.bs.carousel.data-api', '[data-slide]', clickHandler) - .on('click.bs.carousel.data-api', '[data-slide-to]', clickHandler) - - $(window).on('load', function () { - $('[data-ride="carousel"]').each(function () { - var $carousel = $(this) - Plugin.call($carousel, $carousel.data()) - }) - }) - -}(jQuery); - -/* ======================================================================== - * Bootstrap: collapse.js v3.3.1 - * http://getbootstrap.com/javascript/#collapse - * ======================================================================== - * Copyright 2011-2014 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE) - * ======================================================================== */ - - -+function ($) { - 'use strict'; - - // COLLAPSE PUBLIC CLASS DEFINITION - // ================================ - - var Collapse = function (element, options) { - this.$element = $(element) - this.options = $.extend({}, Collapse.DEFAULTS, options) - this.$trigger = $(this.options.trigger).filter('[href="#' + element.id + '"], [data-target="#' + element.id + '"]') - this.transitioning = null - - if (this.options.parent) { - this.$parent = this.getParent() - } else { - this.addAriaAndCollapsedClass(this.$element, this.$trigger) - } - - if (this.options.toggle) this.toggle() - } - - Collapse.VERSION = '3.3.1' - - Collapse.TRANSITION_DURATION = 350 - - Collapse.DEFAULTS = { - toggle: true, - trigger: '[data-toggle="collapse"]' - } - - Collapse.prototype.dimension = function () { - var hasWidth = this.$element.hasClass('width') - return hasWidth ? 'width' : 'height' - } - - Collapse.prototype.show = function () { - if (this.transitioning || this.$element.hasClass('in')) return - - var activesData - var actives = this.$parent && this.$parent.find('> .panel').children('.in, .collapsing') - - if (actives && actives.length) { - activesData = actives.data('bs.collapse') - if (activesData && activesData.transitioning) return - } - - var startEvent = $.Event('show.bs.collapse') - this.$element.trigger(startEvent) - if (startEvent.isDefaultPrevented()) return - - if (actives && actives.length) { - Plugin.call(actives, 'hide') - activesData || actives.data('bs.collapse', null) - } - - var dimension = this.dimension() - - this.$element - .removeClass('collapse') - .addClass('collapsing')[dimension](0) - .attr('aria-expanded', true) - - this.$trigger - .removeClass('collapsed') - .attr('aria-expanded', true) - - this.transitioning = 1 - - var complete = function () { - this.$element - .removeClass('collapsing') - .addClass('collapse in')[dimension]('') - this.transitioning = 0 - this.$element - .trigger('shown.bs.collapse') - } - - if (!$.support.transition) return complete.call(this) - - var scrollSize = $.camelCase(['scroll', dimension].join('-')) - - this.$element - .one('bsTransitionEnd', $.proxy(complete, this)) - .emulateTransitionEnd(Collapse.TRANSITION_DURATION)[dimension](this.$element[0][scrollSize]) - } - - Collapse.prototype.hide = function () { - if (this.transitioning || !this.$element.hasClass('in')) return - - var startEvent = $.Event('hide.bs.collapse') - this.$element.trigger(startEvent) - if (startEvent.isDefaultPrevented()) return - - var dimension = this.dimension() - - this.$element[dimension](this.$element[dimension]())[0].offsetHeight - - this.$element - .addClass('collapsing') - .removeClass('collapse in') - .attr('aria-expanded', false) - - this.$trigger - .addClass('collapsed') - .attr('aria-expanded', false) - - this.transitioning = 1 - - var complete = function () { - this.transitioning = 0 - this.$element - .removeClass('collapsing') - .addClass('collapse') - .trigger('hidden.bs.collapse') - } - - if (!$.support.transition) return complete.call(this) - - this.$element - [dimension](0) - .one('bsTransitionEnd', $.proxy(complete, this)) - .emulateTransitionEnd(Collapse.TRANSITION_DURATION) - } - - Collapse.prototype.toggle = function () { - this[this.$element.hasClass('in') ? 'hide' : 'show']() - } - - Collapse.prototype.getParent = function () { - return $(this.options.parent) - .find('[data-toggle="collapse"][data-parent="' + this.options.parent + '"]') - .each($.proxy(function (i, element) { - var $element = $(element) - this.addAriaAndCollapsedClass(getTargetFromTrigger($element), $element) - }, this)) - .end() - } - - Collapse.prototype.addAriaAndCollapsedClass = function ($element, $trigger) { - var isOpen = $element.hasClass('in') - - $element.attr('aria-expanded', isOpen) - $trigger - .toggleClass('collapsed', !isOpen) - .attr('aria-expanded', isOpen) - } - - function getTargetFromTrigger($trigger) { - var href - var target = $trigger.attr('data-target') - || (href = $trigger.attr('href')) && href.replace(/.*(?=#[^\s]+$)/, '') // strip for ie7 - - return $(target) - } - - - // COLLAPSE PLUGIN DEFINITION - // ========================== - - function Plugin(option) { - return this.each(function () { - var $this = $(this) - var data = $this.data('bs.collapse') - var options = $.extend({}, Collapse.DEFAULTS, $this.data(), typeof option == 'object' && option) - - if (!data && options.toggle && option == 'show') options.toggle = false - if (!data) $this.data('bs.collapse', (data = new Collapse(this, options))) - if (typeof option == 'string') data[option]() - }) - } - - var old = $.fn.collapse - - $.fn.collapse = Plugin - $.fn.collapse.Constructor = Collapse - - - // COLLAPSE NO CONFLICT - // ==================== - - $.fn.collapse.noConflict = function () { - $.fn.collapse = old - return this - } - - - // COLLAPSE DATA-API - // ================= - - $(document).on('click.bs.collapse.data-api', '[data-toggle="collapse"]', function (e) { - var $this = $(this) - - if (!$this.attr('data-target')) e.preventDefault() - - var $target = getTargetFromTrigger($this) - var data = $target.data('bs.collapse') - var option = data ? 'toggle' : $.extend({}, $this.data(), { trigger: this }) - - Plugin.call($target, option) - }) - -}(jQuery); - -/* ======================================================================== - * Bootstrap: dropdown.js v3.3.1 - * http://getbootstrap.com/javascript/#dropdowns - * ======================================================================== - * Copyright 2011-2014 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE) - * ======================================================================== */ - - -+function ($) { - 'use strict'; - - // DROPDOWN CLASS DEFINITION - // ========================= - - var backdrop = '.dropdown-backdrop' - var toggle = '[data-toggle="dropdown"]' - var Dropdown = function (element) { - $(element).on('click.bs.dropdown', this.toggle) - } - - Dropdown.VERSION = '3.3.1' - - Dropdown.prototype.toggle = function (e) { - var $this = $(this) - - if ($this.is('.disabled, :disabled')) return - - var $parent = getParent($this) - var isActive = $parent.hasClass('open') - - clearMenus() - - if (!isActive) { - if ('ontouchstart' in document.documentElement && !$parent.closest('.navbar-nav').length) { - // if mobile we use a backdrop because click events don't delegate - $('