diff --git a/03-vector_data.qmd b/03-vector_data.qmd index aa93d66ec54f229a4bae83f25809c629ec8696ce..792b87ce0b63727fc164c122978384cfdd44879e 100644 --- a/03-vector_data.qmd +++ b/03-vector_data.qmd @@ -79,7 +79,7 @@ district[district$ADM1_EN == "Phnom Penh", 1:4] Selection of roads that are intersecting **dangkao** district ```{r intersects, nm=TRUE, class.output="code-out", warning=FALSE, message=FALSE} -road <- st_read("data_cambodia/cambodia.gpkg", layer = "road", quiet = TRUE) +road <- st_read("data_cambodia/cambodia.gpkg", layer = "road", quiet = TRUE) %>% st_cast("LINESTRING") dangkao <- district[district$ADM2_EN == "Dangkao", ] inter <- st_intersects(x = road, y = dangkao, sparse = FALSE) head(inter) diff --git a/05-mapping_with_r.qmd b/05-mapping_with_r.qmd new file mode 100644 index 0000000000000000000000000000000000000000..675223a679f13e052ef802061fd91fcca94366e1 --- /dev/null +++ b/05-mapping_with_r.qmd @@ -0,0 +1,889 @@ +--- +bibliography: references.bib +--- + +# Mapping With R + +## Types of maps + +The fonction `mf_map()` is the central function of the package `mapsf` [@mapsf]. It makes it possible to carry out most of the usual representations in cartography. These main arguments are: + +- `x`, an sf object ; +- `var`, the name of variable to present ; +- `type`, the type of presentation. + +### Example data + +The following lines import the spatial information layers located in the [geopackage](https://www.geopackage.org/) **cambodia.gpkg** file. + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +library(sf) + +#Import Cambodia country border +country = st_read("data_cambodia/cambodia.gpkg", layer = "country", quiet = TRUE) +#Import provincial administrative border of Cambodia +education = st_read("data_cambodia/cambodia.gpkg", layer = "education", quiet = TRUE) +#Import district administrative border of Cambodia +district = st_read("data_cambodia/cambodia.gpkg", layer = "district", quiet = TRUE) +#Import roads data in Cambodia +road = st_read("data_cambodia/cambodia.gpkg", layer = "road", quiet = TRUE) +#Import health center data in Cambodia +hospital = st_read("data_cambodia/cambodia.gpkg", layer = "hospital", quiet = TRUE) + +``` + +### Displaying a background map + +Without using types specification, the function `mf_map()` simply display the background map. + +```{r mf_base, class.output="code-out", warning=FALSE, message=FALSE} +library(mapsf) + +mf_map(x = district, border = "white") +mf_map(x = country,lwd = 2, col = NA, add = TRUE) +mf_map(x = road, lwd = .5, col = "ivory4", add = TRUE) +mf_map(x = hospital, pch = 20, cex = 1, col = "#FE9A2E", add = TRUE) +``` + +### Proportional symbol map + +Proportional symbol maps are used to represent inventory variables (absolute quantitative variables, sum and average make sense). The function `mf_map(..., type = "prop")` proposes this representation. + +```{r proportional_symbols, class.output="code-out", warning=FALSE, message=FALSE} + +#District +mf_map(x = district) + +# Proportional symbol +mf_map( + x = district, + var = "T_POP", + val_max = 700000, + type = "prop", + col = "#148F77", + leg_title = "Population 2019" +) + +# Title +mf_title("Distribution of population in provincial level") + +``` + +#### Compare multiple map + +It is possible to fix the dimensions of the largest symbol corresponding to a certain value with the arguments `inches` and `val_max`. We can use construct maps with comparable proportional symbols. + +```{r proportional_symbols_comp, fig.height = 4, class.output="code-out", warning=FALSE, message=FALSE} +par(mfrow = c(1,2)) #Displaying two maps facing each other + +#district +mf_map(x = district, border = "grey90", lwd = .5) +# Add male Population +mf_map( + x = district, + var = "Male", + type = "prop", + col = "#1F618D", + inches = 0.2, + val_max = 300000, + leg_title = "Male", + leg_val_cex = 0.5, +) +mf_title("Male Population by Distict") #Adding map title + +#district +mf_map(x = district, border = "grey90", lwd = .5) +# Add female Population +mf_map( + x = district, + var = "Female", + type = "prop", + col = "#E74C3C", + inches = 0.2, + val_max = 300000, + leg_title ="Female", + leg_val_cex = 0.5 +) +mf_title("Female Population by Distict") #Adding map title + +``` + +Here we have displayed two maps facing each other, see the point [Displaying several maps on the same figure](#afficher-plusieurs-cartes-sur-la-même-figure) for more details. + +### Choropleth map + +Choropleth maps are used to represent ratio variables (relative quantitative variables, mean has meaning, sum has no meaning). + +For this type of representation, you must first: + +- choose a discretization method to transform a continuous statistical series into classes defined by intervals, +- choose a number of classes, +- choose a color palette. + +The function mf_map(..., type = "choro")makes it possible to create choroplete maps. The arguments nbreaks and breaks are used to parameterize the discretizations, and the function `mf_get_breaks()` makes it possible to work on the discretizations outside the function `mf_map()`. Similarly, the argument palis used to fill in a color palette, but several functions can be used to set the palettes apart from the (`mf_get_pal`...) function. + +```{r choro, class.output="code-out", warning=FALSE, message=FALSE} +# Population density (inhabitants/km2) using the sf::st_area() function +district$DENS <- 1e6 * district$T_POP / as.numeric(st_area(district)) #Calculate population density +mf_map( + x = district, + var = "DENS", + type = "choro", + breaks = "quantile", + pal = "BuGn", + lwd = 1, + leg_title = "Distribution of population\n(inhabitants per km2)", + leg_val_rnd = 0 +) +mf_title("Distribution of the population in (2019)") +``` + +#### Discretisation {#discretisation} + +The fonction `mf_get_breaks()` provides the methods of discretization of classic variables: quantiles, average/standard deviation, equal amplitudes, nested averages, Fisher-Jenks, geometric, etc. + +```{r discr2, fig.height=6, fig.width=8, class.output="code-out", warning=FALSE, message=FALSE} + +education$enrol_g_pct = 100 * education$enrol_girl/education$t_enrol #Calculate percentage of enrolled girl student + +d1 = mf_get_breaks(education$enrol_g_pct, nbreaks = 6, breaks = "equal", freq = TRUE) +d2 = mf_get_breaks(education$enrol_g_pct, nbreaks = 6, breaks = "quantile") +d3 = mf_get_breaks(education$enrol_g_pct, nbreaks = 6, breaks = "geom") +d4 = mf_get_breaks(education$enrol_g_pct, breaks = "msd", central = FALSE) + +``` + +```{r discr3, fig.height=6, fig.width=8, echo = FALSE, class.output="code-out", warning=FALSE, message=FALSE} + +opar <- par(mfrow = c(2,2)) +hist(education$enrol_g_pct, breaks = d1, main = "d1 : equal amplitudes") +rug(education$enrol_g_pct) + +hist(education$enrol_g_pct, breaks = d2, main = "d2 : equal numbers") +abline(v = quantile(education$enrol_g_pct, probs = seq(0,1,length.out = 7)), col = "red") +legend("topright", legend = "quantiles", col = "red", lty = 1, bty = "n") +rug(education$enrol_g_pct) + +hist(education$enrol_g_pct, breaks = d3, main = "d3 :geometric progression") +rug(education$enrol_g_pct) + +hist(education$enrol_g_pct, breaks = d4, main = "d4 : mean and standard deviation") +abline(v = mean(education$enrol_g_pct), col = "red") +abline(v = mean(education$enrol_g_pct) + sd(education$enrol_g_pct), col = "blue") +abline(v = mean(education$enrol_g_pct) - sd(education$enrol_g_pct), col = "blue") +legend("topright", legend = c("mean", "mean +/-\n standard deviation"), col = c("red", "blue"), lty = 1, bty = "n") +rug(education$enrol_g_pct) +par(opar) + +``` + +#### Color palettes {#palettes} + +The argument `pal` de `mf_map()` is dedicated to choosing a color palette. The palettes provided by the function `hcl.colors()` can be used directly. + +```{r pal1, fig.width = 6, fig.height = 6, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(x = education, var = "enrol_g_pct", type = "choro", + breaks = d3, pal = "Reds 3") +``` + +{fig-align="center" width="600"} + +The fonction `mf_get_pal()` allows you to build a color palette. This function is especially useful for creating balanced asymmetrical diverging palettes. + +```{r pal2, fig.height=3, nm=TRUE, class.output="code-out", warning=FALSE, message=FALSE} + +mypal <- mf_get_pal(n = c(4,6), palette = c("Burg", "Teal")) +image(1:10, 1, as.matrix(1:10), col=mypal, xlab = "", ylab = "", xaxt = "n", + yaxt = "n",bty = "n") + +``` + +#### For a point layer + +It is possible to use this mode of presentation in specific implementation also. + +```{r choropt, class.output="code-out", warning=FALSE, message=FALSE} +dist_c <- st_centroid(district) +mf_map(district) +mf_map( + x = dist_c, + var = "DENS", + type = "choro", + breaks = "quantile", + nbreaks = 5, + pal = "PuRd", + pch = 23, + cex = 1.5, + border = "white", + lwd = .7, + leg_pos = "topleft", + leg_title = "Distribution of population\n(inhabitants per km2)", + leg_val_rnd = 0, + add = TRUE +) +mf_title("Distribution of population in (2019)") + +``` + +### Typology map + +Typology maps are used to represent qualitative variables. The function `mf_map(..., type = "typo")` proposes this representation. + +```{r typo_simple, class.output="code-out", warning=FALSE, message=FALSE} +mf_map( + x = district, + var="Status", + type = "typo", + pal = c('#E8F9FD','#FF7396','#E4BAD4','#FFE3FE'), + lwd = .7, + leg_title = "" +) +mf_title("Administrative status by size of area") +``` + +#### Ordering value in the legend + +The argument `val_order` is used to order the categories in the + +```{r typo_order, class.output="code-out", warning=FALSE, message=FALSE} +mf_map( + x = district, + var="Status", + type = "typo", + pal = c('#E8F9FD','#FF7396','#E4BAD4','#FFE3FE'), + val_order = c("1st largest district", "2nd largest district", "3rd largest district","<4500km2"), + lwd = .7, + leg_title = "" +) +mf_title("Administrative status by size of area") +``` + +#### Map of point + +When the implantation of the layer is punctual, symbols are used to carry the colors of the typology. + +```{r typo_point, class.output="code-out", warning=FALSE, message=FALSE} +#extract centroid point of the district +dist_ctr <- st_centroid(district[district$Status != "<4500km2", ]) +mf_map(district) +mf_map( + x = dist_ctr, + var = "Status", + type = "typo", + cex = 2, + pch = 22, + pal = c('#FF7396','#E4BAD4','#FFE3FE'), + leg_title = "", + leg_pos = "bottomright", + add = TRUE +) +mf_title("Administrative status by size of area") + +``` + +#### Map of lines + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +#Selection of roads that intersect the city of Siem Reap +pp <- district[district$ADM1_EN == "Phnom Penh", ] +road_pp <- road[st_intersects(x = road, y = pp, sparse = FALSE), ] +mf_map(pp) +mf_map( + x = road_pp, + var = "fclass", + type = "typo", + lwd = 1.2, + pal = mf_get_pal(n = 6, "Tropic"), + leg_title = "Types of road", + leg_pos = "topright", + leg_frame = T, + add = TRUE +) +mf_title("Administrative status") +``` + +### Map of stocks and ratios + +The function `mf_map(..., var = c("var1", "var2"), type = "prop_choro")` represents proportional symbols whose areas are proportional to the values of one variable and whose color is based on the discretization of a second variable. The function uses the arguments of the functions `mf_map(..., type = "prop")` and `mf_map(..., type = "choro")`. + +```{r choroprop, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(x = district) +mf_map( + x = district, + var = c("T_POP", "DENS"), + val_max = 500000, + type = "prop_choro", + border = "grey60", + lwd = 0.5, + leg_pos = c("bottomright", "bottomleft"), + leg_title = c("Population", "Density of\n population\n(inhabitants per km2)"), + breaks = "q6", + pal = "Blues 3", + leg_val_rnd = c(0,1)) +mf_title("Population") +``` + +### Map of stocks and categories + +The function `mf_map(..., var = c("var1", "var2"), type = "prop_typo")` represents proportional symbols whose areas are proportional to the values of one variable and whose color is based on the discretization of a second variable. The function uses the arguments of the `mf_map(..., type = "prop")` and function `mf_map(..., type = "typo")`. + +```{r typoprop, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(x = district) +mf_map( + x = district, + var = c("Area.Km2.", "Status"), + type = "prop_typo", + pal = c('#E8F9FD','#FF7396','#E4BAD4','#FFE3FE'), + val_order = c("<4500km2","1st largest district", "2nd largest district", "3rd largest district"), + leg_pos = c("bottomleft","topleft"), + leg_title = c("Population\n(2019)", + "Statut administratif"), +) +mf_title("Population") +``` + +## Layout + +To be finalized, a thematic map must contain certain additional elements such as: title, author, source, scale, orientation... + +### Example data + +The following lines import the spatial information layers located in the [geopackage](https://www.geopackage.org/) **lot46.gpkg** file. + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +library(sf) +country = st_read("data_cambodia/cambodia.gpkg", layer = "country", quiet = TRUE) #Import Cambodia country border +education = st_read("data_cambodia/cambodia.gpkg", layer = "education", quiet = TRUE) #Import provincial administrative border of Cambodia +district = st_read("data_cambodia/cambodia.gpkg", layer = "district", quiet = TRUE) #Import district administrative border of Cambodia +road = st_read("data_cambodia/cambodia.gpkg", layer = "road", quiet = TRUE) #Import roads data in Cambodia +hospital = st_read("data_cambodia/cambodia.gpkg", layer = "hospital", quiet = TRUE) #Import hospital data in Cambodia +cases = st_read("data_cambodia/cambodia.gpkg", layer = "cases", quiet = TRUE) #Import example data of fever_cases in Cambodia + +``` + +### Themes + +The function `mf_theme()` defines a cartographic theme. Using a theme allows you to define several graphic parameters which are then applied to the maps created with `mapsf`. These parameters are: the map margins, the main color, the background color, the position and the aspect of the title. A theme can also be defined with the `mf_init()` and function `mf_export()`. + +#### Use a predefined theme + +A series of predefined themes are available by default (see `?mf_theme`). + +```{r them1, fig.show='hold', fig.width =8, fig.height = 8, class.output="code-out", warning=FALSE, message=FALSE} +library(mapsf) +# use of a background color for the figure, to see the use of margin +opar <- par(mfrow = c(2,2)) +# Using a predefined theme +mf_theme("default") +mf_map(district) +mf_title("Theme : 'default'") + +mf_theme("darkula") +mf_map(district) +mf_title("Theme : 'darkula'") + +mf_theme("candy") +mf_map(district) +mf_title("Theme : 'candy'") + +mf_theme("nevermind") +mf_map(district) +mf_title("Theme : 'nevermind'") +par(opar) + +``` + +#### Modify an existing theme + +It is possible to modify an existing theme. In this example, we are using the "default" theme and modifying a few settings. + +```{r theme2, fig.width = 8, fig.height = 4, fig.show='hold', class.output="code-out", warning=FALSE, message=FALSE} +library(mapsf) +opar <- par(mfrow = c(1,2)) +mf_theme("default") +mf_map(district) +mf_title("default") + +mf_theme("default", tab = FALSE, font = 4, bg = "grey60", pos = "center") +mf_map(district) +mf_title("modified default") +par(opar) +``` + +#### Create a theme + +It is also possible to create a theme. + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +mf_theme( + bg = "lightblue", # background color + fg = "tomato1", # main color + mar = c(1,0,1.5,0), # margin + tab = FALSE, # "tab" style for the title + inner = FALSE, # title inside or outside of map area + line = 1.5, # space dedicated to title + pos = "center", # heading position + cex = 1.5, # title size + font = 2 # font types for title +) +mf_map(district) +mf_title("New theme") +``` + +### Titles + +The function `mf_title()` adds a title to a map. + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +mf_theme("default") +mf_map(district) +mf_title("Map title") +``` + +It is possible to customize the appearance of the title + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(district) +mf_title( + txt = "Map title", + pos = "center", + tab = FALSE, + bg = "tomato3", + fg = "lightblue", + cex = 1.5, + line = 1.7, + font = 1, + inner = FALSE +) +``` + +### Arrow orientation + +The function `mf_arrow()` allows you to choose the position and aspect of orientation arrow. + +```{r north, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(district) +mf_arrow() +``` + +### Scale + +The function `mf_scale()` allows you to choose the position and the aspect of the scale. + +```{r scale, class.output="code-out", warning=FALSE, message=FALSE} + +mf_map(district) +mf_scale( + size = 60, + lwd = 1, + cex = 0.7 +) + +``` + +### Credits + +The function `mf_credits()` displays a line of credits (sources, author, etc.). + +```{r credit, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(district) +mf_credits("IRD\nInstitut Pasteur du Cambodge, 2022") +``` + +### Complete dressing + +The function `mf_layout()` displays all these elements. + +```{r layout1, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(district) +mf_layout( + title = "Cambodia", + credits = "IRD\nInstitut Pasteur du Cambodge, 2022", + arrow = TRUE +) +``` + +### Annotations + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(district) +mf_annotation(district[district$ADM2_EN == "Bakan",], txt = "Bakan", col_txt = "darkred", halo = TRUE, cex = 1.5) + +``` + +### Legends + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +mf_map(district) +mf_legend( + type = "prop", + val = c(1000,500,200,10), + inches = .2, + title = "Population", + pos = "topleft" +) +mf_legend( + type = "choro", + val = c(0,10,20,30,40), + pal = "Greens", + pos = "bottomright", + val_rnd = 0 +) + +``` + +### Labels + +The function `mf_label()` is dedicated to displaying labels. + +```{r labs, class.output="code-out", warning=FALSE, message=FALSE} +dist_selected <- district[st_intersects(district, district[district$ADM2_EN == "Bakan", ], sparse = F), ] + +mf_map(dist_selected) +mf_label( + x = dist_selected, + var = "ADM2_EN", + col= "darkgreen", + halo = TRUE, + overlap = FALSE, + lines = FALSE +) +mf_scale() +``` + +The argument `halo = TRUE` allows to display a slight halo around the labels and the argument `overlap = FALSE` allows to create non-overlapping labels. + +### Center the map on a region + +The function `mf_init()` allows you to initialize a map by centering it on a spatial object. + +```{r, class.output="code-out", warning=FALSE, message=FALSE} +mf_init(x = dist_selected) +mf_map(district, add = TRUE) +mf_map(dist_selected, col = NA, border = "#29a3a3", lwd = 2, add = TRUE) +``` + +### Displaying several maps on the sam figure + +Here you have to use `mfrow` of the function `par()`. The first digit represents the number of of rows and second the number of columns. + +```{r mfrow0, fig.width=7, fig.height = 3.5, eval = TRUE, class.output="code-out", warning=FALSE, message=FALSE} +# define the figure layout (1 row, 2 columns) +par(mfrow = c(1, 2)) + +# first map +mf_map(district) +mf_map(district, "Male", "prop", val_max = 300000) +mf_title("Population, male") + +# second map +mf_map(district) +mf_map(district, "Female", "prop", val_max = 300000) +mf_title("Population, female") +``` + +### Exporting maps + +It is quite difficult to export figures (maps or others) whose height/width ratio is satisfactory. The default ratio of figures in png format is 1 (480x480 pixels): + +```{r, results='hide', class.output="code-out", warning=FALSE, message=FALSE} +dist_filter <- district[district$ADM2_PCODE == "KH0808", ] +png("img/dist_filter_1.png") +mf_map(dist_filter) +mf_title("Filtered district") +dev.off() +``` + +{fig-align="center"} + +On this map a lot of space is lost to the left and right of the district. + +The function `mf_export()` allows exports of maps whose height/width ratio is controlled and corresponds to that of a spatial object. + +```{r, results='hide', class.output="code-out", warning=FALSE, message=FALSE} +mf_export(dist_filter, "img/dist_filter_2.png", width = 480) +mf_map(dist_filter) +mf_title("Filtered district") +dev.off() +``` + +{fig-align="center" width="218"} + +The extent of this map is exactly that of the displayed region. + +### Adding an image to a map + +This can be useful for adding a logo, a pictograph. The function `readPNG()` of package `png` allows the additional images on the figure. + +```{r logo, class.output="code-out", warning=FALSE, message=FALSE} +mf_theme("default", mar = c(0,0,0,0)) +library(png) + +logo <- readPNG("img/ird_logo.png") #Import image +pp <- dim(logo)[2:1]*200 #Image dimension in map unit (width and height of the original image) + +#The upper left corner of the department's bounding box +xy <- st_bbox(district)[c(1,4)] +mf_map(district, col = "#D1914D", border = "white") +rasterImage( + image = logo, + xleft = xy[1] , + ybottom = xy[2] - pp[2], + xright = xy[1] + pp[1], + ytop = xy[2] +) + +``` + +### Place an item precisely on the map + +The function `locator()` allows clicking on the figure and obtaining the coordinate of a point in the coordinate system of the figure (of the map). + +```{Place texts or items on map} +# locator(1) # click to get coordinate on map +# points(locator(1)) # click to plot point on map +# text(locator(1), # click to place the item on map +# labels ="Located any texts on map", +# adj = c(0,0)) + +``` + + + +`locator()`peut être utilisée sur la plupart des graphiques (pas ceux produits avec `ggplot2`). + +::: {.callout-note appearance="minimal" icon="false"} +[How to interactively position legends and layout elements on a map with cartography](https://rgeomatic.hypotheses.org/1837) +::: + +### Add shading to a layer + +The function `mf_shadow()` allows to create a shadow to a layer of polygons. + +```{r shadow, class.output="code-out", warning=FALSE, message=FALSE} +mf_shadow(district) +mf_map(district, add=TRUE) + +``` + +### Creating Boxes + +The function `mf_inset_on()` allows to start creation a box. You must then "close" the box with `mf_inset_off()`. + +```{r inset, fig.width = 6.5, fig.height = 5, class.output="code-out", warning=FALSE, message=FALSE} + +mf_init(x = dist_selected, theme = "agolalight", expandBB = c(0,.1,0,.5)) +mf_map(district, add = TRUE) +mf_map(dist_selected, col = "tomato4", border = "tomato1", lwd = 2, add = TRUE) + +# Cambodia inset box +mf_inset_on(x = country, pos = "topright", cex = .3) +mf_map(country, lwd = .5, border= "grey90") +mf_map(dist_selected, col = "tomato4", border = "tomato1", lwd = .5, add = TRUE) +mf_scale(size = 100, pos = "bottomleft", cex = .6, lwd = .5) +mf_inset_off() + +# District inset box +mf_inset_on(x = district, pos = "bottomright", cex = .3) +mf_map(district, lwd = 0.5, border= "grey90") +mf_map(dist_selected, col = "tomato4", border = "tomato1", lwd = .5, add = TRUE) +mf_scale(size = 100, pos = "bottomright", cex = .6, lwd = .5) +mf_inset_off() + +# World inset box +mf_inset_on(x = "worldmap", pos = "topleft") +mf_worldmap(dist_selected, land_col = "#cccccc", border_col = NA, + water_col = "#e3e3e3", col = "tomato4") + +mf_inset_off() +mf_title("Bakan district and its surroundings") +mf_scale(10, pos = 'bottomleft') + +``` + +## 3D maps + +### linemap + +The package `linemap` [@linemap] allows you to make maps made up of lines. + +```{r linemap, class.output="code-out", warning=FALSE, message=FALSE} +library(linemap) +library(mapsf) +library(sf) +library(dplyr) + +pp = st_read("data_cambodia/PP.gpkg", quiet = TRUE) # import Phnom Penh administrative border +pp_pop_dens <- getgrid(x = pp, cellsize =1000, var = "DENs") # create population density in grid format (pop density/1km) + +mf_init(pp) + +linemap( + x = pp_pop_dens, + var = "DENs", + k = 1, + threshold = 5, + lwd = 1, + col = "ivory1", + border = "ivory4", + add = T) + +mf_title("Phnom Penh Population Density, 2019") +mf_credits("Humanitarian Data Exchange, 2022\nunit data:km2") + + +# url = "https://data.humdata.org/dataset/1803994d-6218-4b98-ac3a-30c7f85c6dbc/resource/f30b0f4b-1c40-45f3-986d-2820375ea8dd/download/health_facility.zip" +# health_facility.zip = "health_facility.zip" +# download.file(url, destfile = health_facility.zip) +# unzip(health_facility.zip) # Unzipped files are in a new folder named Health +# list.files(path="Health") + +``` + +### Relief Tanaka + +We use the `tanaka` package [@tanaka] which provides a method [@tanaka1950] used to improve the perception of relief. + +```{r tanaka, class.output="code-out", warning=FALSE, message=FALSE} +library(tanaka) +library(terra) + +rpop <- rast("data_cambodia/khm_pd_2019_1km_utm.tif") # Import population raster data (in UTM) +district = st_read("data_cambodia/cambodia.gpkg", layer = "district", quiet = TRUE) # Import Cambodian districts layer +district <- st_transform(district, st_crs(rpop)) # Transform data into the same coordinate system + +mat <- focalMat(x = rpop, d = c(1500), type = "Gauss") # Raster smoothing +rpopl <- focal(x = rpop, w = mat, fun = sum, na.rm = TRUE) + +# Mapping +cols <- hcl.colors(8, "Reds", alpha = 1, rev = T)[-1] +mf_theme("agolalight") +mf_init(district) +tanaka(x = rpop, breaks = c(0,10,25,50,100,250,500,64265), + col = cols, add = T, mask = district, legend.pos = "n") +mf_legend(type = "choro", pos = "bottomright", + val = c(0,10,25,50,100,250,500,64265), pal = cols, + bg = "#EDF4F5", fg = NA, frame = T, val_rnd = 0, + title = "Population\nper km2") +mf_title("Population density of Cambodia, 2019") +mf_credits("Humanitarian Data Exchange, 2022", + bg = "#EDF4F5") + +``` + +::: {.callout-note appearance="minimal" icon="false"} +[The tanaka package](https://rgeomatic.hypotheses.org/1758) +::: + +## Cartographic Transformation + +> classical anamorphosis is a representation of States(or any cells) by **rectangle or any polygons** according to a **quantities** attached to them. (...) We strive to **keep the general arrangement** of meshes or the silhouette of the continent."\ +> @Brunet93 + +3 types of anamorphoses or cartograms are presented here: + +- Dorling's cartograms [@Dorling96] +- Non-contiguous cartograms [@Olson76] +- Contiguous cartograms [@Dougenik85] + +::: {.callout-note appearance="minimal" icon="false"} +A comprehensive course on anamorphoses : [Les anamorphoses cartographiques](https://neocarto.hypotheses.org/366) [@Lambert15]. +::: + +::: {.callout-note appearance="minimal" icon="false"} +[Make cartograms with R](https://rgeomatic.hypotheses.org/1361) +::: + +To make the cartograms we use the package `cartogram` [@cartogram]. + +### Dorling's cartograms + +The territories are represented by figures (circles, squares or rectangles) which do not overlap, the surface of which are proportional to a variable. The proportion of the figures are defined according to the starting positions. + +{fig-align="center" width="600"} + +```{block2, type='rmdmoins'} +Space is quite poorly identified. +You can name the circles to get your bearings and/or use the color to make clusters appear and better identify the geographical blocks. +``` + +```{block2, type='rmdplus'} +The perception of quantities is very good. The circle sizes are really comarable. +``` + +```{r dorling, class.output="code-out", warning=FALSE, message=FALSE} +library(mapsf) +library(cartogram) +district <- st_read("data_cambodia/cambodia.gpkg", layer = "district" , quiet = TRUE) +dist_dorling <- cartogram_dorling(x = district, weight = "T_POP", k = 0.7) +mf_map(dist_dorling, col = "#40E0D0", border= "white") +mf_label( + x = dist_dorling[order(dist_dorling$T_POP, decreasing = TRUE), ][1:10,], + var = "ADM2_EN", + overlap = FALSE, + # show.lines = FALSE, + halo = TRUE, + r = 0.15 +) +mf_title("Population of District - Dorling Cartogram") +``` + +The parameter `k` allows to vary the expansion factor of the circles. + +### Non-continuous cartograms + +The size of the polygons is proportional to a variable. The arrangement of the polygons relative to each other is preserved. The shape of the polygons is similar. + +{fig-align="center"} + +[@Cauvin13] + +```{block2, type='rmdmoins'} +The topology of the regions is lost. +``` + +```{block2, type='rmdplus'} +The converstion of the polygons shape is optimal. +``` + +```{r olson, class.output="code-out", warning=FALSE, message=FALSE} +dist_ncont <- cartogram_ncont(x = district, weight = "T_POP", k = 1.2) +mf_map(district, col = NA, border = "#FDFEFE", lwd = 1.5) +mf_map(dist_ncont, col = "#20B2AA", border= "white", add = TRUE) +mf_title("Population of District - Non-continuous cartograms") +``` + +The parameter `k` allows to vary the expansion of the polygons. + +### Continuous cartograms + +The size of the polygons is proportional to variable. The arrangement of the polygons relative to each other is preserved. To maintain contiguity, the sape of the polygons is heavily transformed. + +{fig-align="center" width="600"} + +[@Paull16] + +```{block2, type='rmdmoins'} +The shape of the polygond is strongly distorted. +``` + +```{block2, type='rmdplus'} + +It is a "real geographical map": topology and contiguity are preserved. + +``` + +```{r dougenik} +dist_ncont <- cartogram_cont(x = district, weight = "DENs", maxSizeError = 6) +mf_map(dist_ncont, col = "#66CDAA", border= "white", add = FALSE) +mf_title("Population of District - Continuous cartograms") +mf_inset_on(district, cex = .2, pos = "bottomleft") +mf_map(district, lwd = .5) +mf_inset_off() +``` + +### Stengths and weaknessses of cartograms + +cartograms are cartographic representations perceived as **innovative** (although the method is 40 years old). These very generalize images capture **quantities** and **gradients** well. These are real **communication** images that **provoke**, arouse **interest**, convey a strong **message**, **challenge**. + +But cartograms induce a loss of **visual cues** (difficult to find one's country or region on the map), require a **reading effort** which can be significant and do not make it possible to manage **missing data**. diff --git a/_quarto.yml b/_quarto.yml index 54a76643951d3e71a3c3dad31ea22b51308d4469..597acb70df25a203b4326cfa4d8d8796390c6c94 100644 --- a/_quarto.yml +++ b/_quarto.yml @@ -15,6 +15,7 @@ book: - 01-introduction.qmd - 02-data_acquisition.qmd - 03-vector_data.qmd + - 05-mapping_with_r.qmd - references.qmd bibliography: references.bib diff --git a/data_cambodia/district.gpkg b/data_cambodia/district.gpkg index 1ad5fa038d31e57a0c363dfb82e2dd0138dcf642..031b50c19f905ccf98e290a1079527ab3b16d383 100644 Binary files a/data_cambodia/district.gpkg and b/data_cambodia/district.gpkg differ diff --git a/img/cartogram.jpg b/img/cartogram.jpg new file mode 100644 index 0000000000000000000000000000000000000000..5eb5cdc1b9459d888e795790c9b20a323f164e80 Binary files /dev/null and b/img/cartogram.jpg differ diff --git a/img/dist_filter_1.png b/img/dist_filter_1.png new file mode 100644 index 0000000000000000000000000000000000000000..e11d04497a5dd79cb75c5f49140e6855f14397a7 Binary files /dev/null and b/img/dist_filter_1.png differ diff --git a/img/dist_filter_2.png b/img/dist_filter_2.png new file mode 100644 index 0000000000000000000000000000000000000000..a31388d9d9ce499fc265419d80913c158fa8e6fa Binary files /dev/null and b/img/dist_filter_2.png differ diff --git a/img/dorling.png b/img/dorling.png new file mode 100644 index 0000000000000000000000000000000000000000..26e49fa394993c1d747e3345a43a7fad43cebe4f Binary files /dev/null and b/img/dorling.png differ diff --git a/img/ird_logo.png b/img/ird_logo.png new file mode 100644 index 0000000000000000000000000000000000000000..ec5552d6aa5c6356fad92b35dd6b6a0ee532c74d Binary files /dev/null and b/img/ird_logo.png differ diff --git a/img/locator.webm b/img/locator.webm new file mode 100644 index 0000000000000000000000000000000000000000..5f6a2252f682d9f3c51ac719ebdbfdfa6c1f0ba5 Binary files /dev/null and b/img/locator.webm differ diff --git a/img/nccartogram.png b/img/nccartogram.png new file mode 100644 index 0000000000000000000000000000000000000000..ae2aaaf60ebb290320224e86f6320a85d9cf7591 Binary files /dev/null and b/img/nccartogram.png differ diff --git a/img/swatch-plot-1.svg b/img/swatch-plot-1.svg new file mode 100644 index 0000000000000000000000000000000000000000..6fbd46fa3641d644c4240d9e627e2279381dfcec --- /dev/null +++ b/img/swatch-plot-1.svg @@ -0,0 +1,1736 @@ +<?xml version="1.0" encoding="UTF-8"?> +<svg xmlns="http://www.w3.org/2000/svg" xmlns:xlink="http://www.w3.org/1999/xlink" width="705pt" height="648pt" viewBox="0 0 705 648" version="1.1"> +<defs> +<g> +<symbol overflow="visible" id="glyph0-0"> +<path style="stroke:none;" d=""/> +</symbol> +<symbol overflow="visible" id="glyph0-1"> +<path style="stroke:none;" d="M 1.546875 -2.59375 L 3.46875 -2.59375 C 3.953125 -2.59375 4.328125 -2.734375 4.65625 -3.03125 C 5.03125 -3.375 5.1875 -3.765625 5.1875 -4.328125 C 5.1875 -5.484375 4.5 -6.125 3.296875 -6.125 L 0.765625 -6.125 L 0.765625 0 L 1.546875 0 Z M 1.546875 -3.28125 L 1.546875 -5.4375 L 3.171875 -5.4375 C 3.921875 -5.4375 4.375 -5.03125 4.375 -4.359375 C 4.375 -3.6875 3.921875 -3.28125 3.171875 -3.28125 Z M 1.546875 -3.28125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-2"> +<path style="stroke:none;" d="M 4.5 -0.40625 C 4.421875 -0.390625 4.390625 -0.390625 4.34375 -0.390625 C 4.109375 -0.390625 3.96875 -0.515625 3.96875 -0.734375 L 3.96875 -3.328125 C 3.96875 -4.109375 3.390625 -4.53125 2.3125 -4.53125 C 1.671875 -4.53125 1.15625 -4.34375 0.84375 -4.015625 C 0.640625 -3.796875 0.5625 -3.53125 0.546875 -3.109375 L 1.25 -3.109375 C 1.3125 -3.640625 1.625 -3.890625 2.28125 -3.890625 C 2.921875 -3.890625 3.265625 -3.640625 3.265625 -3.234375 L 3.265625 -3.046875 C 3.265625 -2.734375 3.109375 -2.625 2.53125 -2.5625 C 1.546875 -2.421875 1.390625 -2.390625 1.125 -2.28125 C 0.609375 -2.0625 0.359375 -1.6875 0.359375 -1.109375 C 0.359375 -0.3125 0.90625 0.1875 1.796875 0.1875 C 2.359375 0.1875 2.796875 0 3.296875 -0.453125 C 3.34375 0 3.5625 0.1875 4.015625 0.1875 C 4.171875 0.1875 4.265625 0.171875 4.5 0.125 Z M 3.265625 -1.390625 C 3.265625 -1.15625 3.203125 -1.015625 3 -0.8125 C 2.703125 -0.5625 2.359375 -0.421875 1.953125 -0.421875 C 1.40625 -0.421875 1.078125 -0.6875 1.078125 -1.125 C 1.078125 -1.59375 1.390625 -1.828125 2.140625 -1.9375 C 2.890625 -2.03125 3.03125 -2.0625 3.265625 -2.171875 Z M 3.265625 -1.390625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-3"> +<path style="stroke:none;" d="M 3.6875 -3.171875 C 3.671875 -4.046875 3.109375 -4.53125 2.078125 -4.53125 C 1.0625 -4.53125 0.390625 -4 0.390625 -3.1875 C 0.390625 -2.5 0.75 -2.171875 1.796875 -1.921875 L 2.453125 -1.75 C 2.9375 -1.640625 3.125 -1.46875 3.125 -1.15625 C 3.125 -0.734375 2.71875 -0.453125 2.09375 -0.453125 C 1.71875 -0.453125 1.40625 -0.5625 1.234375 -0.75 C 1.125 -0.875 1.0625 -1 1.03125 -1.3125 L 0.28125 -1.3125 C 0.3125 -0.296875 0.890625 0.1875 2.046875 0.1875 C 3.15625 0.1875 3.859375 -0.359375 3.859375 -1.203125 C 3.859375 -1.859375 3.484375 -2.21875 2.609375 -2.421875 L 1.9375 -2.59375 C 1.375 -2.71875 1.125 -2.90625 1.125 -3.21875 C 1.125 -3.625 1.484375 -3.890625 2.0625 -3.890625 C 2.625 -3.890625 2.921875 -3.640625 2.9375 -3.171875 Z M 3.6875 -3.171875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-4"> +<path style="stroke:none;" d="M 2.140625 -4.40625 L 1.40625 -4.40625 L 1.40625 -5.609375 L 0.71875 -5.609375 L 0.71875 -4.40625 L 0.125 -4.40625 L 0.125 -3.828125 L 0.71875 -3.828125 L 0.71875 -0.5 C 0.71875 -0.046875 1.015625 0.1875 1.5625 0.1875 C 1.75 0.1875 1.90625 0.171875 2.140625 0.140625 L 2.140625 -0.453125 C 2.03125 -0.421875 1.9375 -0.421875 1.796875 -0.421875 C 1.5 -0.421875 1.40625 -0.5 1.40625 -0.8125 L 1.40625 -3.828125 L 2.140625 -3.828125 Z M 2.140625 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-5"> +<path style="stroke:none;" d="M 4.3125 -1.96875 C 4.3125 -2.640625 4.265625 -3.046875 4.140625 -3.375 C 3.84375 -4.09375 3.171875 -4.53125 2.359375 -4.53125 C 1.125 -4.53125 0.34375 -3.59375 0.34375 -2.140625 C 0.34375 -0.6875 1.09375 0.1875 2.34375 0.1875 C 3.34375 0.1875 4.046875 -0.375 4.21875 -1.34375 L 3.515625 -1.34375 C 3.328125 -0.75 2.921875 -0.453125 2.359375 -0.453125 C 1.921875 -0.453125 1.53125 -0.65625 1.296875 -1.03125 C 1.140625 -1.28125 1.078125 -1.53125 1.0625 -1.96875 Z M 1.078125 -2.53125 C 1.140625 -3.359375 1.640625 -3.890625 2.34375 -3.890625 C 3.0625 -3.890625 3.5625 -3.328125 3.5625 -2.53125 Z M 1.078125 -2.53125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-6"> +<path style="stroke:none;" d="M 1.28125 -6.125 L 0.578125 -6.125 L 0.578125 0 L 1.28125 0 Z M 1.28125 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-7"> +<path style="stroke:none;" d=""/> +</symbol> +<symbol overflow="visible" id="glyph0-8"> +<path style="stroke:none;" d="M 2.171875 -4.328125 L 2.171875 0 L 2.921875 0 L 2.921875 -6.078125 L 2.421875 -6.078125 C 2.171875 -5.140625 2 -5.015625 0.859375 -4.859375 L 0.859375 -4.328125 Z M 2.171875 -4.328125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-9"> +<path style="stroke:none;" d="M 0.75 0 L 3.109375 0 C 4.65625 0 5.609375 -1.15625 5.609375 -3.0625 C 5.609375 -4.96875 4.671875 -6.125 3.109375 -6.125 L 0.75 -6.125 Z M 1.53125 -0.6875 L 1.53125 -5.4375 L 2.96875 -5.4375 C 4.1875 -5.4375 4.828125 -4.625 4.828125 -3.0625 C 4.828125 -1.5 4.1875 -0.6875 2.96875 -0.6875 Z M 1.53125 -0.6875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-10"> +<path style="stroke:none;" d="M 0.578125 -4.40625 L 0.578125 0 L 1.28125 0 L 1.28125 -2.28125 C 1.296875 -3.34375 1.734375 -3.8125 2.703125 -3.796875 L 2.703125 -4.5 C 2.578125 -4.515625 2.515625 -4.53125 2.421875 -4.53125 C 1.96875 -4.53125 1.625 -4.265625 1.234375 -3.609375 L 1.234375 -4.40625 Z M 0.578125 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-11"> +<path style="stroke:none;" d="M 1.1875 -6.125 L 0.484375 -6.125 L 0.484375 0 L 1.1875 0 L 1.1875 -1.71875 L 1.859375 -2.390625 L 3.359375 0 L 4.21875 0 L 2.421875 -2.890625 L 3.953125 -4.40625 L 3.046875 -4.40625 L 1.1875 -2.53125 Z M 1.1875 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-12"> +<path style="stroke:none;" d="M 4.25 -0.734375 L 1.125 -0.734375 C 1.1875 -1.234375 1.46875 -1.5625 2.1875 -2 L 3.03125 -2.46875 C 3.859375 -2.9375 4.296875 -3.5625 4.296875 -4.296875 C 4.296875 -4.8125 4.09375 -5.28125 3.734375 -5.609375 C 3.390625 -5.921875 2.953125 -6.078125 2.390625 -6.078125 C 1.625 -6.078125 1.0625 -5.8125 0.734375 -5.28125 C 0.53125 -4.96875 0.4375 -4.59375 0.421875 -3.96875 L 1.15625 -3.96875 C 1.1875 -4.390625 1.234375 -4.625 1.34375 -4.828125 C 1.53125 -5.203125 1.921875 -5.4375 2.359375 -5.4375 C 3.03125 -5.4375 3.53125 -4.9375 3.53125 -4.28125 C 3.53125 -3.796875 3.265625 -3.375 2.734375 -3.078125 L 1.953125 -2.625 C 0.71875 -1.90625 0.359375 -1.34375 0.28125 -0.015625 L 4.25 -0.015625 Z M 4.25 -0.734375 "/> +</symbol> +<symbol overflow="visible" id="glyph0-13"> +<path style="stroke:none;" d="M 1.859375 -2.796875 L 2.265625 -2.796875 C 3.0625 -2.796875 3.5 -2.421875 3.5 -1.6875 C 3.5 -0.921875 3.03125 -0.46875 2.265625 -0.46875 C 1.453125 -0.46875 1.0625 -0.875 1.015625 -1.765625 L 0.265625 -1.765625 C 0.296875 -1.28125 0.390625 -0.953125 0.53125 -0.6875 C 0.84375 -0.09375 1.421875 0.1875 2.234375 0.1875 C 3.46875 0.1875 4.25 -0.546875 4.25 -1.703125 C 4.25 -2.46875 3.953125 -2.890625 3.25 -3.140625 C 3.796875 -3.375 4.078125 -3.796875 4.078125 -4.40625 C 4.078125 -5.453125 3.390625 -6.078125 2.265625 -6.078125 C 1.0625 -6.078125 0.421875 -5.40625 0.390625 -4.125 L 1.140625 -4.125 C 1.140625 -4.484375 1.171875 -4.703125 1.265625 -4.890625 C 1.4375 -5.234375 1.8125 -5.4375 2.265625 -5.4375 C 2.921875 -5.4375 3.328125 -5.03125 3.328125 -4.375 C 3.328125 -3.953125 3.171875 -3.6875 2.84375 -3.546875 C 2.640625 -3.46875 2.375 -3.4375 1.859375 -3.421875 Z M 1.859375 -2.796875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-14"> +<path style="stroke:none;" d="M 5.015625 -4.328125 C 5.015625 -4.75 4.984375 -4.859375 4.84375 -5.15625 C 4.515625 -5.859375 3.796875 -6.234375 2.765625 -6.234375 C 1.421875 -6.234375 0.59375 -5.546875 0.59375 -4.4375 C 0.59375 -3.6875 0.984375 -3.21875 1.796875 -3 L 3.3125 -2.59375 C 4.09375 -2.390625 4.4375 -2.078125 4.4375 -1.609375 C 4.4375 -1.28125 4.265625 -0.9375 4 -0.75 C 3.75 -0.578125 3.375 -0.5 2.875 -0.5 C 2.203125 -0.5 1.75 -0.65625 1.46875 -1.015625 C 1.234375 -1.28125 1.140625 -1.578125 1.140625 -1.953125 L 0.40625 -1.953125 C 0.40625 -1.390625 0.515625 -1.015625 0.765625 -0.6875 C 1.1875 -0.09375 1.890625 0.1875 2.828125 0.1875 C 3.5625 0.1875 4.15625 0.03125 4.546875 -0.28125 C 4.953125 -0.609375 5.21875 -1.15625 5.21875 -1.6875 C 5.21875 -2.4375 4.75 -3 3.921875 -3.21875 L 2.375 -3.625 C 1.640625 -3.828125 1.375 -4.0625 1.375 -4.546875 C 1.375 -5.15625 1.921875 -5.578125 2.734375 -5.578125 C 3.71875 -5.578125 4.265625 -5.140625 4.265625 -4.328125 Z M 5.015625 -4.328125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-15"> +<path style="stroke:none;" d="M 6.25 0 L 7.8125 -6.125 L 6.9375 -6.125 L 5.8125 -1.15625 L 4.40625 -6.125 L 3.578125 -6.125 L 2.203125 -1.15625 L 1.0625 -6.125 L 0.1875 -6.125 L 1.75 0 L 2.609375 0 L 3.984375 -5.03125 L 5.390625 0 Z M 6.25 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-16"> +<path style="stroke:none;" d="M 0.59375 -4.40625 L 0.59375 0 L 1.296875 0 L 1.296875 -2.765625 C 1.296875 -3.40625 1.75 -3.921875 2.328125 -3.921875 C 2.84375 -3.921875 3.140625 -3.59375 3.140625 -3.03125 L 3.140625 0 L 3.84375 0 L 3.84375 -2.765625 C 3.84375 -3.40625 4.3125 -3.921875 4.890625 -3.921875 C 5.390625 -3.921875 5.703125 -3.59375 5.703125 -3.03125 L 5.703125 0 L 6.40625 0 L 6.40625 -3.296875 C 6.40625 -4.09375 5.953125 -4.53125 5.125 -4.53125 C 4.546875 -4.53125 4.1875 -4.359375 3.78125 -3.859375 C 3.515625 -4.328125 3.15625 -4.53125 2.59375 -4.53125 C 2 -4.53125 1.609375 -4.3125 1.234375 -3.78125 L 1.234375 -4.40625 Z M 0.59375 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-17"> +<path style="stroke:none;" d="M 5.5625 -4.234375 C 5.328125 -5.578125 4.546875 -6.234375 3.203125 -6.234375 C 2.375 -6.234375 1.71875 -5.96875 1.265625 -5.46875 C 0.703125 -4.859375 0.40625 -3.984375 0.40625 -3 C 0.40625 -1.984375 0.71875 -1.125 1.28125 -0.515625 C 1.765625 -0.03125 2.375 0.1875 3.171875 0.1875 C 4.671875 0.1875 5.5 -0.609375 5.6875 -2.234375 L 4.890625 -2.234375 C 4.8125 -1.8125 4.734375 -1.53125 4.609375 -1.28125 C 4.359375 -0.78125 3.828125 -0.5 3.171875 -0.5 C 1.953125 -0.5 1.1875 -1.46875 1.1875 -3 C 1.1875 -4.578125 1.921875 -5.546875 3.109375 -5.546875 C 3.609375 -5.546875 4.0625 -5.390625 4.328125 -5.15625 C 4.546875 -4.9375 4.671875 -4.6875 4.765625 -4.234375 Z M 5.5625 -4.234375 "/> +</symbol> +<symbol overflow="visible" id="glyph0-18"> +<path style="stroke:none;" d="M 2.28125 -4.53125 C 1.046875 -4.53125 0.296875 -3.640625 0.296875 -2.171875 C 0.296875 -0.6875 1.046875 0.1875 2.296875 0.1875 C 3.53125 0.1875 4.28125 -0.6875 4.28125 -2.140625 C 4.28125 -3.671875 3.5625 -4.53125 2.28125 -4.53125 Z M 2.296875 -3.890625 C 3.078125 -3.890625 3.5625 -3.234375 3.5625 -2.140625 C 3.5625 -1.09375 3.0625 -0.453125 2.296875 -0.453125 C 1.515625 -0.453125 1.03125 -1.09375 1.03125 -2.171875 C 1.03125 -3.234375 1.515625 -3.890625 2.296875 -3.890625 Z M 2.296875 -3.890625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-19"> +<path style="stroke:none;" d="M 4.15625 -6.125 L 3.46875 -6.125 L 3.46875 -3.84375 C 3.171875 -4.296875 2.703125 -4.53125 2.109375 -4.53125 C 0.96875 -4.53125 0.21875 -3.609375 0.21875 -2.203125 C 0.21875 -0.71875 0.9375 0.1875 2.140625 0.1875 C 2.734375 0.1875 3.15625 -0.03125 3.53125 -0.578125 L 3.53125 0 L 4.15625 0 Z M 2.234375 -3.875 C 2.984375 -3.875 3.46875 -3.21875 3.46875 -2.15625 C 3.46875 -1.140625 2.96875 -0.46875 2.234375 -0.46875 C 1.46875 -0.46875 0.953125 -1.140625 0.953125 -2.171875 C 0.953125 -3.1875 1.46875 -3.875 2.234375 -3.875 Z M 2.234375 -3.875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-20"> +<path style="stroke:none;" d="M 4.625 -2.796875 L 4.625 0 L 5.40625 0 L 5.40625 -6.125 L 4.625 -6.125 L 4.625 -3.484375 L 1.484375 -3.484375 L 1.484375 -6.125 L 0.703125 -6.125 L 0.703125 0 L 1.484375 0 L 1.484375 -2.796875 Z M 4.625 -2.796875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-21"> +<path style="stroke:none;" d="M 0.59375 -4.40625 L 0.59375 0 L 1.296875 0 L 1.296875 -2.421875 C 1.296875 -3.328125 1.765625 -3.921875 2.484375 -3.921875 C 3.046875 -3.921875 3.390625 -3.578125 3.390625 -3.046875 L 3.390625 0 L 4.09375 0 L 4.09375 -3.328125 C 4.09375 -4.0625 3.546875 -4.53125 2.703125 -4.53125 C 2.046875 -4.53125 1.625 -4.28125 1.234375 -3.671875 L 1.234375 -4.40625 Z M 0.59375 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-22"> +<path style="stroke:none;" d="M 1.265625 -4.40625 L 0.5625 -4.40625 L 0.5625 0 L 1.265625 0 Z M 1.265625 -6.125 L 0.5625 -6.125 L 0.5625 -5.25 L 1.265625 -5.25 Z M 1.265625 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-23"> +<path style="stroke:none;" d="M 3.953125 -2.921875 C 3.921875 -3.359375 3.828125 -3.625 3.671875 -3.875 C 3.359375 -4.28125 2.828125 -4.53125 2.21875 -4.53125 C 1.03125 -4.53125 0.265625 -3.59375 0.265625 -2.125 C 0.265625 -0.703125 1.015625 0.1875 2.203125 0.1875 C 3.265625 0.1875 3.921875 -0.4375 4.015625 -1.515625 L 3.296875 -1.515625 C 3.1875 -0.8125 2.828125 -0.453125 2.234375 -0.453125 C 1.453125 -0.453125 0.984375 -1.078125 0.984375 -2.125 C 0.984375 -3.234375 1.453125 -3.890625 2.203125 -3.890625 C 2.796875 -3.890625 3.171875 -3.53125 3.25 -2.921875 Z M 3.953125 -2.921875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-24"> +<path style="stroke:none;" d="M 3.265625 -4.40625 L 2.046875 -0.96875 L 0.921875 -4.40625 L 0.171875 -4.40625 L 1.65625 0.015625 L 1.390625 0.71875 C 1.265625 1.03125 1.125 1.140625 0.828125 1.140625 C 0.703125 1.140625 0.609375 1.125 0.453125 1.09375 L 0.453125 1.71875 C 0.59375 1.796875 0.734375 1.828125 0.921875 1.828125 C 1.15625 1.828125 1.390625 1.75 1.578125 1.625 C 1.796875 1.46875 1.921875 1.28125 2.0625 0.921875 L 4.015625 -4.40625 Z M 3.265625 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-25"> +<path style="stroke:none;" d="M 5.953125 -3.234375 L 3.40625 -3.234375 L 3.40625 -2.546875 L 5.265625 -2.546875 L 5.265625 -2.375 C 5.265625 -1.28125 4.46875 -0.5 3.34375 -0.5 C 2.71875 -0.5 2.15625 -0.71875 1.796875 -1.125 C 1.390625 -1.5625 1.15625 -2.28125 1.15625 -3.046875 C 1.15625 -4.546875 2.015625 -5.546875 3.296875 -5.546875 C 4.234375 -5.546875 4.90625 -5.0625 5.078125 -4.265625 L 5.875 -4.265625 C 5.65625 -5.515625 4.71875 -6.234375 3.3125 -6.234375 C 2.5625 -6.234375 1.953125 -6.03125 1.484375 -5.640625 C 0.765625 -5.046875 0.375 -4.109375 0.375 -3 C 0.375 -1.125 1.515625 0.1875 3.171875 0.1875 C 4.015625 0.1875 4.671875 -0.125 5.265625 -0.78125 L 5.46875 0.03125 L 5.953125 0.03125 Z M 5.953125 -3.234375 "/> +</symbol> +<symbol overflow="visible" id="glyph0-26"> +<path style="stroke:none;" d="M 1.453125 -6.125 L 0.671875 -6.125 L 0.671875 0 L 4.484375 0 L 4.484375 -0.6875 L 1.453125 -0.6875 Z M 1.453125 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-27"> +<path style="stroke:none;" d="M 3.390625 -4.40625 L 3.390625 -3.765625 C 3.046875 -4.296875 2.65625 -4.53125 2.09375 -4.53125 C 1.03125 -4.53125 0.296875 -3.53125 0.296875 -2.125 C 0.296875 -1.390625 0.46875 -0.84375 0.84375 -0.40625 C 1.171875 -0.015625 1.59375 0.1875 2.046875 0.1875 C 2.578125 0.1875 2.953125 -0.046875 3.328125 -0.59375 L 3.328125 -0.375 C 3.328125 0.8125 3 1.25 2.125 1.25 C 1.53125 1.25 1.21875 1.015625 1.15625 0.5 L 0.4375 0.5 C 0.5 1.3125 1.15625 1.828125 2.109375 1.828125 C 2.75 1.828125 3.296875 1.625 3.578125 1.265625 C 3.921875 0.859375 4.046875 0.3125 4.046875 -0.71875 L 4.046875 -4.40625 Z M 2.171875 -3.890625 C 2.90625 -3.890625 3.328125 -3.265625 3.328125 -2.140625 C 3.328125 -1.078125 2.90625 -0.453125 2.171875 -0.453125 C 1.453125 -0.453125 1.03125 -1.078125 1.03125 -2.171875 C 1.03125 -3.25 1.453125 -3.890625 2.171875 -3.890625 Z M 2.171875 -3.890625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-28"> +<path style="stroke:none;" d="M 0.59375 -6.125 L 0.59375 0 L 1.28125 0 L 1.28125 -2.421875 C 1.28125 -3.328125 1.75 -3.921875 2.484375 -3.921875 C 2.71875 -3.921875 2.9375 -3.84375 3.109375 -3.71875 C 3.296875 -3.578125 3.390625 -3.359375 3.390625 -3.046875 L 3.390625 0 L 4.078125 0 L 4.078125 -3.328125 C 4.078125 -4.0625 3.5625 -4.53125 2.703125 -4.53125 C 2.078125 -4.53125 1.703125 -4.34375 1.28125 -3.796875 L 1.28125 -6.125 Z M 0.59375 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-29"> +<path style="stroke:none;" d="M 0.671875 0 L 3.4375 0 C 4.015625 0 4.4375 -0.15625 4.765625 -0.515625 C 5.0625 -0.828125 5.234375 -1.265625 5.234375 -1.75 C 5.234375 -2.484375 4.90625 -2.9375 4.125 -3.234375 C 4.6875 -3.5 4.96875 -3.9375 4.96875 -4.578125 C 4.96875 -5.03125 4.796875 -5.40625 4.484375 -5.703125 C 4.15625 -6 3.734375 -6.125 3.15625 -6.125 L 0.671875 -6.125 Z M 1.453125 -3.484375 L 1.453125 -5.4375 L 2.953125 -5.4375 C 3.390625 -5.4375 3.640625 -5.375 3.84375 -5.21875 C 4.0625 -5.046875 4.1875 -4.796875 4.1875 -4.46875 C 4.1875 -4.125 4.0625 -3.875 3.84375 -3.703125 C 3.640625 -3.546875 3.390625 -3.484375 2.953125 -3.484375 Z M 1.453125 -0.6875 L 1.453125 -2.796875 L 3.359375 -2.796875 C 4.046875 -2.796875 4.453125 -2.40625 4.453125 -1.734375 C 4.453125 -1.078125 4.046875 -0.6875 3.359375 -0.6875 Z M 1.453125 -0.6875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-30"> +<path style="stroke:none;" d="M 4.046875 0 L 4.046875 -4.40625 L 3.359375 -4.40625 L 3.359375 -1.90625 C 3.359375 -1.015625 2.890625 -0.421875 2.15625 -0.421875 C 1.59375 -0.421875 1.25 -0.75 1.25 -1.28125 L 1.25 -4.40625 L 0.546875 -4.40625 L 0.546875 -1.015625 C 0.546875 -0.28125 1.09375 0.1875 1.953125 0.1875 C 2.59375 0.1875 3.015625 -0.03125 3.421875 -0.609375 L 3.421875 0 Z M 4.046875 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-31"> +<path style="stroke:none;" d="M 0.453125 1.828125 L 1.15625 1.828125 L 1.15625 -0.46875 C 1.53125 -0.015625 1.9375 0.1875 2.515625 0.1875 C 3.65625 0.1875 4.390625 -0.71875 4.390625 -2.125 C 4.390625 -3.609375 3.671875 -4.53125 2.5 -4.53125 C 1.90625 -4.53125 1.421875 -4.265625 1.09375 -3.734375 L 1.09375 -4.40625 L 0.453125 -4.40625 Z M 2.390625 -3.875 C 3.15625 -3.875 3.671875 -3.1875 3.671875 -2.140625 C 3.671875 -1.140625 3.15625 -0.46875 2.390625 -0.46875 C 1.640625 -0.46875 1.15625 -1.140625 1.15625 -2.171875 C 1.15625 -3.203125 1.640625 -3.875 2.390625 -3.875 Z M 2.390625 -3.875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-32"> +<path style="stroke:none;" d="M 1.5625 -2.640625 L 3.578125 -2.640625 C 4.28125 -2.640625 4.59375 -2.296875 4.59375 -1.546875 L 4.578125 -1 C 4.578125 -0.625 4.65625 -0.25 4.765625 0 L 5.703125 0 L 5.703125 -0.1875 C 5.40625 -0.390625 5.359375 -0.609375 5.34375 -1.421875 C 5.328125 -2.4375 5.171875 -2.734375 4.5 -3.03125 C 5.1875 -3.375 5.46875 -3.78125 5.46875 -4.484375 C 5.46875 -5.546875 4.8125 -6.125 3.609375 -6.125 L 0.78125 -6.125 L 0.78125 0 L 1.5625 0 Z M 1.5625 -3.328125 L 1.5625 -5.4375 L 3.453125 -5.4375 C 3.890625 -5.4375 4.140625 -5.375 4.34375 -5.203125 C 4.546875 -5.03125 4.65625 -4.75 4.65625 -4.390625 C 4.65625 -3.65625 4.28125 -3.328125 3.453125 -3.328125 Z M 1.5625 -3.328125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-33"> +<path style="stroke:none;" d="M 3.265625 -6.234375 C 1.515625 -6.234375 0.3125 -4.9375 0.3125 -3.015625 C 0.3125 -1.09375 1.5 0.1875 3.28125 0.1875 C 4.03125 0.1875 4.6875 -0.03125 5.171875 -0.453125 C 5.84375 -1.015625 6.234375 -1.96875 6.234375 -2.96875 C 6.234375 -4.9375 5.0625 -6.234375 3.265625 -6.234375 Z M 3.265625 -5.546875 C 4.59375 -5.546875 5.453125 -4.546875 5.453125 -2.984375 C 5.453125 -1.5 4.578125 -0.5 3.28125 -0.5 C 1.96875 -0.5 1.09375 -1.5 1.09375 -3.015625 C 1.09375 -4.53125 1.96875 -5.546875 3.265625 -5.546875 Z M 3.265625 -5.546875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-34"> +<path style="stroke:none;" d="M 2.390625 -2.625 L 0.390625 -2.625 L 0.390625 -2.015625 L 2.390625 -2.015625 Z M 2.390625 -2.625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-35"> +<path style="stroke:none;" d="M 3.25 -2.40625 L 5.5625 -6.125 L 4.625 -6.125 L 2.875 -3.140625 L 1.078125 -6.125 L 0.109375 -6.125 L 2.46875 -2.40625 L 2.46875 0 L 3.25 0 Z M 3.25 -2.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-36"> +<path style="stroke:none;" d="M 4.65625 0 L 5.953125 -4.40625 L 5.15625 -4.40625 L 4.28125 -0.96875 L 3.421875 -4.40625 L 2.5625 -4.40625 L 1.71875 -0.96875 L 0.828125 -4.40625 L 0.046875 -4.40625 L 1.328125 0 L 2.125 0 L 2.96875 -3.453125 L 3.859375 0 Z M 4.65625 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-37"> +<path style="stroke:none;" d="M 2.96875 -5.4375 L 4.984375 -5.4375 L 4.984375 -6.125 L 0.171875 -6.125 L 0.171875 -5.4375 L 2.1875 -5.4375 L 2.1875 0 L 2.96875 0 Z M 2.96875 -5.4375 "/> +</symbol> +<symbol overflow="visible" id="glyph0-38"> +<path style="stroke:none;" d="M 3.296875 0 L 5.421875 -6.125 L 4.59375 -6.125 L 2.890625 -0.9375 L 1.09375 -6.125 L 0.25 -6.125 L 2.453125 0 Z M 3.296875 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-39"> +<path style="stroke:none;" d="M 1.625 -6.125 L 0.84375 -6.125 L 0.84375 0 L 1.625 0 Z M 1.625 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-40"> +<path style="stroke:none;" d="M 2.171875 -4.40625 L 1.4375 -4.40625 L 1.4375 -5.09375 C 1.4375 -5.390625 1.59375 -5.546875 1.921875 -5.546875 C 1.984375 -5.546875 2.015625 -5.546875 2.171875 -5.53125 L 2.171875 -6.109375 C 2.015625 -6.140625 1.921875 -6.15625 1.78125 -6.15625 C 1.125 -6.15625 0.734375 -5.78125 0.734375 -5.15625 L 0.734375 -4.40625 L 0.15625 -4.40625 L 0.15625 -3.828125 L 0.734375 -3.828125 L 0.734375 0 L 1.4375 0 L 1.4375 -3.828125 L 2.171875 -3.828125 Z M 2.171875 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-41"> +<path style="stroke:none;" d="M 3.9375 0 L 5.65625 -5.140625 L 5.65625 0 L 6.390625 0 L 6.390625 -6.125 L 5.3125 -6.125 L 3.53125 -0.796875 L 1.71875 -6.125 L 0.625 -6.125 L 0.625 0 L 1.375 0 L 1.375 -5.140625 L 3.109375 0 Z M 3.9375 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-42"> +<path style="stroke:none;" d="M 1.53125 -2.796875 L 4.875 -2.796875 L 4.875 -3.484375 L 1.53125 -3.484375 L 1.53125 -5.4375 L 5 -5.4375 L 5 -6.125 L 0.75 -6.125 L 0.75 0 L 5.15625 0 L 5.15625 -0.6875 L 1.53125 -0.6875 Z M 1.53125 -2.796875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-43"> +<path style="stroke:none;" d="M 4.859375 1.0625 L -0.1875 1.0625 L -0.1875 1.484375 L 4.859375 1.484375 Z M 4.859375 1.0625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-44"> +<path style="stroke:none;" d="M 0.59375 -4.40625 L 0.59375 0.640625 C 0.59375 1.078125 0.453125 1.21875 0.015625 1.21875 C -0.03125 1.21875 -0.0625 1.21875 -0.15625 1.203125 L -0.15625 1.8125 C -0.0625 1.828125 -0.03125 1.828125 0.078125 1.828125 C 0.875 1.828125 1.28125 1.515625 1.28125 0.921875 L 1.28125 -4.40625 Z M 1.28125 -6.125 L 0.59375 -6.125 L 0.59375 -5.25 L 1.28125 -5.25 Z M 1.28125 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-45"> +<path style="stroke:none;" d="M 0.453125 -6.125 L 0.453125 0 L 1.078125 0 L 1.078125 -0.5625 C 1.421875 -0.046875 1.859375 0.1875 2.484375 0.1875 C 3.640625 0.1875 4.390625 -0.75 4.390625 -2.21875 C 4.390625 -3.640625 3.6875 -4.53125 2.515625 -4.53125 C 1.90625 -4.53125 1.484375 -4.296875 1.15625 -3.8125 L 1.15625 -6.125 Z M 2.375 -3.875 C 3.15625 -3.875 3.671875 -3.1875 3.671875 -2.140625 C 3.671875 -1.140625 3.140625 -0.46875 2.375 -0.46875 C 1.625 -0.46875 1.15625 -1.140625 1.15625 -2.171875 C 1.15625 -3.203125 1.625 -3.875 2.375 -3.875 Z M 2.375 -3.875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-46"> +<path style="stroke:none;" d="M 2.125 -4.40625 L 1.390625 -4.40625 L 1.390625 -5.09375 C 1.390625 -5.390625 1.546875 -5.546875 1.875 -5.546875 C 1.9375 -5.546875 1.953125 -5.546875 2.125 -5.53125 L 2.125 -6.109375 C 1.953125 -6.140625 1.859375 -6.15625 1.71875 -6.15625 C 1.078125 -6.15625 0.6875 -5.78125 0.6875 -5.15625 L 0.6875 -4.40625 L 0.09375 -4.40625 L 0.09375 -3.828125 L 0.6875 -3.828125 L 0.6875 0 L 1.390625 0 L 1.390625 -3.828125 L 2.125 -3.828125 Z M 3.671875 -4.40625 L 2.96875 -4.40625 L 2.96875 0 L 3.671875 0 Z M 3.671875 -6.125 L 2.96875 -6.125 L 2.96875 -5.25 L 3.671875 -5.25 Z M 3.671875 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-47"> +<path style="stroke:none;" d="M 3.984375 -1.84375 L 4.609375 0 L 5.484375 0 L 3.34375 -6.125 L 2.328125 -6.125 L 0.140625 0 L 0.96875 0 L 1.625 -1.84375 Z M 3.765625 -2.5 L 1.8125 -2.5 L 2.828125 -5.28125 Z M 3.765625 -2.5 "/> +</symbol> +<symbol overflow="visible" id="glyph0-48"> +<path style="stroke:none;" d="M 1.53125 -2.796875 L 4.46875 -2.796875 L 4.46875 -3.484375 L 1.53125 -3.484375 L 1.53125 -5.4375 L 4.859375 -5.4375 L 4.859375 -6.125 L 0.75 -6.125 L 0.75 0 L 1.53125 0 Z M 1.53125 -2.796875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-49"> +<path style="stroke:none;" d="M 4.890625 -6.125 L 0.46875 -6.125 L 0.46875 -5.4375 L 3.921875 -5.4375 L 0.234375 -0.6875 L 0.234375 0 L 4.90625 0 L 4.90625 -0.6875 L 1.21875 -0.6875 L 4.890625 -5.421875 Z M 4.890625 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-50"> +<path style="stroke:none;" d="M 2.390625 0 L 4.078125 -4.40625 L 3.296875 -4.40625 L 2.046875 -0.828125 L 0.875 -4.40625 L 0.078125 -4.40625 L 1.625 0 Z M 2.390625 0 "/> +</symbol> +</g> +</defs> +<g id="surface7"> +<rect x="0" y="0" width="705" height="648" style="fill:rgb(100%,100%,100%);fill-opacity:1;stroke:none;"/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="17.023438" y="68.123047"/> + <use xlink:href="#glyph0-2" x="22.023438" y="68.123047"/> + <use xlink:href="#glyph0-3" x="27.023438" y="68.123047"/> + <use xlink:href="#glyph0-4" x="31.023438" y="68.123047"/> + <use xlink:href="#glyph0-5" x="33.023438" y="68.123047"/> + <use xlink:href="#glyph0-6" x="38.023438" y="68.123047"/> + <use xlink:href="#glyph0-7" x="40.023438" y="68.123047"/> + <use xlink:href="#glyph0-8" x="42.023438" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-9" x="17.023438" y="99.603516"/> + <use xlink:href="#glyph0-2" x="23.023438" y="99.603516"/> + <use xlink:href="#glyph0-10" x="28.023438" y="99.603516"/> + <use xlink:href="#glyph0-11" x="31.023438" y="99.603516"/> + <use xlink:href="#glyph0-7" x="35.023438" y="99.603516"/> + <use xlink:href="#glyph0-12" x="37.023438" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-9" x="17.023438" y="131.087891"/> + <use xlink:href="#glyph0-2" x="23.023438" y="131.087891"/> + <use xlink:href="#glyph0-10" x="28.023438" y="131.087891"/> + <use xlink:href="#glyph0-11" x="31.023438" y="131.087891"/> + <use xlink:href="#glyph0-7" x="35.023438" y="131.087891"/> + <use xlink:href="#glyph0-13" x="37.023438" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="17.023438" y="162.568359"/> + <use xlink:href="#glyph0-5" x="23.023438" y="162.568359"/> + <use xlink:href="#glyph0-4" x="28.023438" y="162.568359"/> + <use xlink:href="#glyph0-7" x="30.023438" y="162.568359"/> + <use xlink:href="#glyph0-12" x="32.023438" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="17.023438" y="194.048828"/> + <use xlink:href="#glyph0-5" x="23.023438" y="194.048828"/> + <use xlink:href="#glyph0-4" x="28.023438" y="194.048828"/> + <use xlink:href="#glyph0-7" x="30.023438" y="194.048828"/> + <use xlink:href="#glyph0-13" x="32.023438" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-15" x="17.023438" y="225.529297"/> + <use xlink:href="#glyph0-2" x="25.023438" y="225.529297"/> + <use xlink:href="#glyph0-10" x="30.023438" y="225.529297"/> + <use xlink:href="#glyph0-16" x="33.023438" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-17" x="17.023438" y="257.013672"/> + <use xlink:href="#glyph0-18" x="23.023438" y="257.013672"/> + <use xlink:href="#glyph0-6" x="28.023438" y="257.013672"/> + <use xlink:href="#glyph0-19" x="30.023438" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-20" x="17.023438" y="288.494141"/> + <use xlink:href="#glyph0-2" x="23.023438" y="288.494141"/> + <use xlink:href="#glyph0-10" x="28.023438" y="288.494141"/> + <use xlink:href="#glyph0-16" x="31.023438" y="288.494141"/> + <use xlink:href="#glyph0-18" x="38.023438" y="288.494141"/> + <use xlink:href="#glyph0-21" x="43.023438" y="288.494141"/> + <use xlink:href="#glyph0-22" x="48.023438" y="288.494141"/> + <use xlink:href="#glyph0-23" x="50.023438" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-9" x="17.023438" y="319.974609"/> + <use xlink:href="#glyph0-24" x="23.023438" y="319.974609"/> + <use xlink:href="#glyph0-21" x="27.023438" y="319.974609"/> + <use xlink:href="#glyph0-2" x="32.023438" y="319.974609"/> + <use xlink:href="#glyph0-16" x="37.023438" y="319.974609"/> + <use xlink:href="#glyph0-22" x="44.023438" y="319.974609"/> + <use xlink:href="#glyph0-23" x="46.023438" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="17.023438" y="351.455078"/> + <use xlink:href="#glyph0-10" x="24.023438" y="351.455078"/> + <use xlink:href="#glyph0-2" x="27.023438" y="351.455078"/> + <use xlink:href="#glyph0-24" x="31.023438" y="351.455078"/> + <use xlink:href="#glyph0-3" x="35.023438" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-26" x="17.023438" y="382.939453"/> + <use xlink:href="#glyph0-22" x="22.023438" y="382.939453"/> + <use xlink:href="#glyph0-27" x="24.023438" y="382.939453"/> + <use xlink:href="#glyph0-28" x="29.023438" y="382.939453"/> + <use xlink:href="#glyph0-4" x="34.023438" y="382.939453"/> + <use xlink:href="#glyph0-7" x="36.023438" y="382.939453"/> + <use xlink:href="#glyph0-25" x="38.023438" y="382.939453"/> + <use xlink:href="#glyph0-10" x="45.023438" y="382.939453"/> + <use xlink:href="#glyph0-2" x="48.023438" y="382.939453"/> + <use xlink:href="#glyph0-24" x="52.023438" y="382.939453"/> + <use xlink:href="#glyph0-3" x="56.023438" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="17.023438" y="414.419922"/> + <use xlink:href="#glyph0-6" x="23.023438" y="414.419922"/> + <use xlink:href="#glyph0-30" x="25.023438" y="414.419922"/> + <use xlink:href="#glyph0-5" x="30.023438" y="414.419922"/> + <use xlink:href="#glyph0-3" x="35.023438" y="414.419922"/> + <use xlink:href="#glyph0-7" x="39.023438" y="414.419922"/> + <use xlink:href="#glyph0-12" x="41.023438" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="17.023438" y="445.900391"/> + <use xlink:href="#glyph0-6" x="23.023438" y="445.900391"/> + <use xlink:href="#glyph0-30" x="25.023438" y="445.900391"/> + <use xlink:href="#glyph0-5" x="30.023438" y="445.900391"/> + <use xlink:href="#glyph0-3" x="35.023438" y="445.900391"/> + <use xlink:href="#glyph0-7" x="39.023438" y="445.900391"/> + <use xlink:href="#glyph0-13" x="41.023438" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="17.023438" y="477.380859"/> + <use xlink:href="#glyph0-30" x="23.023438" y="477.380859"/> + <use xlink:href="#glyph0-10" x="28.023438" y="477.380859"/> + <use xlink:href="#glyph0-31" x="31.023438" y="477.380859"/> + <use xlink:href="#glyph0-6" x="36.023438" y="477.380859"/> + <use xlink:href="#glyph0-5" x="38.023438" y="477.380859"/> + <use xlink:href="#glyph0-3" x="43.023438" y="477.380859"/> + <use xlink:href="#glyph0-7" x="47.023438" y="477.380859"/> + <use xlink:href="#glyph0-12" x="49.023438" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="17.023438" y="508.865234"/> + <use xlink:href="#glyph0-30" x="23.023438" y="508.865234"/> + <use xlink:href="#glyph0-10" x="28.023438" y="508.865234"/> + <use xlink:href="#glyph0-31" x="31.023438" y="508.865234"/> + <use xlink:href="#glyph0-6" x="36.023438" y="508.865234"/> + <use xlink:href="#glyph0-5" x="38.023438" y="508.865234"/> + <use xlink:href="#glyph0-3" x="43.023438" y="508.865234"/> + <use xlink:href="#glyph0-7" x="47.023438" y="508.865234"/> + <use xlink:href="#glyph0-13" x="49.023438" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="17.023438" y="540.345703"/> + <use xlink:href="#glyph0-5" x="23.023438" y="540.345703"/> + <use xlink:href="#glyph0-19" x="28.023438" y="540.345703"/> + <use xlink:href="#glyph0-3" x="33.023438" y="540.345703"/> + <use xlink:href="#glyph0-7" x="37.023438" y="540.345703"/> + <use xlink:href="#glyph0-12" x="39.023438" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="17.023438" y="571.826172"/> + <use xlink:href="#glyph0-5" x="23.023438" y="571.826172"/> + <use xlink:href="#glyph0-19" x="28.023438" y="571.826172"/> + <use xlink:href="#glyph0-3" x="33.023438" y="571.826172"/> + <use xlink:href="#glyph0-7" x="37.023438" y="571.826172"/> + <use xlink:href="#glyph0-13" x="39.023438" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(100%,77.254902%,81.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 72.148438 L 30.355469 72.148438 L 30.355469 87.890625 L 17.023438 87.890625 Z M 17.023438 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,83.137255%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 72.148438 L 43.6875 72.148438 L 43.6875 87.890625 L 30.355469 87.890625 Z M 30.355469 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(65.882353%,88.235294%,74.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 72.148438 L 57.023438 72.148438 L 57.023438 87.890625 L 43.691406 87.890625 Z M 43.691406 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(64.313725%,86.666667%,93.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 72.148438 L 70.355469 72.148438 L 70.355469 87.890625 L 57.023438 87.890625 Z M 57.023438 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(89.411765%,79.607843%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 72.148438 L 83.6875 72.148438 L 83.6875 87.890625 L 70.355469 87.890625 Z M 70.355469 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(78.431373%,47.843137%,54.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 103.628906 L 30.355469 103.628906 L 30.355469 119.371094 L 17.023438 119.371094 Z M 17.023438 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(63.529412%,56.470588%,28.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 103.628906 L 43.6875 103.628906 L 43.6875 119.371094 L 30.355469 119.371094 Z M 30.355469 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(27.058824%,63.529412%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 103.628906 L 57.023438 103.628906 L 57.023438 119.371094 L 43.691406 119.371094 Z M 43.691406 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(16.470588%,61.960784%,70.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 103.628906 L 70.355469 103.628906 L 70.355469 119.371094 L 57.023438 119.371094 Z M 57.023438 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,50.980392%,76.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 103.628906 L 83.6875 103.628906 L 83.6875 119.371094 L 70.355469 119.371094 Z M 70.355469 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(88.235294%,41.568627%,52.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 135.109375 L 30.355469 135.109375 L 30.355469 150.851562 L 17.023438 150.851562 Z M 17.023438 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(66.666667%,56.470588%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 135.109375 L 43.6875 135.109375 L 43.6875 150.851562 L 30.355469 150.851562 Z M 30.355469 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,66.666667%,35.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 135.109375 L 57.023438 135.109375 L 57.023438 150.851562 L 43.691406 150.851562 Z M 43.691406 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,65.098039%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 135.109375 L 70.355469 135.109375 L 70.355469 150.851562 L 57.023438 150.851562 Z M 57.023438 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(71.372549%,45.882353%,87.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 135.109375 L 83.6875 135.109375 L 83.6875 150.851562 L 70.355469 150.851562 Z M 70.355469 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,56.470588%,64.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 166.59375 L 30.355469 166.59375 L 30.355469 182.335938 L 17.023438 182.335938 Z M 17.023438 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(75.294118%,67.058824%,32.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 166.59375 L 43.6875 166.59375 L 43.6875 182.335938 L 30.355469 182.335938 Z M 30.355469 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(30.980392%,74.901961%,52.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 166.59375 L 57.023438 166.59375 L 57.023438 182.335938 L 43.691406 182.335938 Z M 43.691406 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(15.686275%,73.333333%,84.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 166.59375 L 70.355469 166.59375 L 70.355469 182.335938 L 57.023438 182.335938 Z M 57.023438 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(77.647059%,60%,90.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 166.59375 L 83.6875 166.59375 L 83.6875 182.335938 L 70.355469 182.335938 Z M 70.355469 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,70.196078%,70.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 198.074219 L 30.355469 198.074219 L 30.355469 213.816406 L 17.023438 213.816406 Z M 17.023438 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(81.176471%,78.823529%,50.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 198.074219 L 43.6875 198.074219 L 43.6875 213.816406 L 30.355469 213.816406 Z M 30.355469 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(46.27451%,85.098039%,69.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 198.074219 L 57.023438 198.074219 L 57.023438 213.816406 L 43.691406 213.816406 Z M 43.691406 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(52.156863%,81.568627%,94.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 198.074219 L 70.355469 198.074219 L 70.355469 213.816406 L 57.023438 213.816406 Z M 57.023438 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(90.588235%,70.980392%,96.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 198.074219 L 83.6875 198.074219 L 83.6875 213.816406 L 70.355469 213.816406 Z M 70.355469 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(67.058824%,69.019608%,39.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 229.554688 L 30.355469 229.554688 L 30.355469 245.296875 L 17.023438 245.296875 Z M 17.023438 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,65.490196%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 229.554688 L 43.6875 229.554688 L 43.6875 245.296875 L 30.355469 245.296875 Z M 30.355469 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,61.568627%,52.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 229.554688 L 57.023438 229.554688 L 57.023438 245.296875 L 43.691406 245.296875 Z M 43.691406 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(89.411765%,58.431373%,64.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 229.554688 L 70.355469 229.554688 L 70.355469 245.296875 L 57.023438 245.296875 Z M 57.023438 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(87.843137%,57.647059%,76.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 229.554688 L 83.6875 229.554688 L 83.6875 245.296875 L 70.355469 245.296875 Z M 70.355469 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(67.45098%,64.313725%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 261.035156 L 30.355469 261.035156 L 30.355469 276.777344 L 17.023438 276.777344 Z M 17.023438 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,69.019608%,86.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 261.035156 L 43.6875 261.035156 L 43.6875 276.777344 L 30.355469 276.777344 Z M 30.355469 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(29.803922%,72.54902%,80%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 261.035156 L 57.023438 261.035156 L 57.023438 276.777344 L 43.691406 276.777344 Z M 43.691406 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(22.352941%,74.509804%,69.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 261.035156 L 70.355469 261.035156 L 70.355469 276.777344 L 57.023438 276.777344 Z M 57.023438 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(36.078431%,74.117647%,57.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 261.035156 L 83.6875 261.035156 L 83.6875 276.777344 L 70.355469 276.777344 Z M 70.355469 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,65.490196%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 292.519531 L 30.355469 292.519531 L 30.355469 308.261719 L 17.023438 308.261719 Z M 17.023438 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(60%,70.980392%,41.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 292.519531 L 43.6875 292.519531 L 43.6875 308.261719 L 30.355469 308.261719 Z M 30.355469 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(36.078431%,74.117647%,57.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 292.519531 L 57.023438 292.519531 L 57.023438 308.261719 L 43.691406 308.261719 Z M 43.691406 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(23.137255%,73.72549%,74.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 292.519531 L 70.355469 292.519531 L 70.355469 308.261719 L 57.023438 308.261719 Z M 57.023438 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,69.019608%,86.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 292.519531 L 83.6875 292.519531 L 83.6875 308.261719 L 70.355469 308.261719 Z M 70.355469 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,61.568627%,52.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 324 L 30.355469 324 L 30.355469 339.742188 L 17.023438 339.742188 Z M 17.023438 324 "/> +<path style="fill-rule:nonzero;fill:rgb(61.568627%,70.588235%,41.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 324 L 43.6875 324 L 43.6875 339.742188 L 30.355469 339.742188 Z M 30.355469 324 "/> +<path style="fill-rule:nonzero;fill:rgb(23.921569%,74.509804%,67.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 324 L 57.023438 324 L 57.023438 339.742188 L 43.691406 339.742188 Z M 43.691406 324 "/> +<path style="fill-rule:nonzero;fill:rgb(52.941176%,68.235294%,87.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 324 L 70.355469 324 L 70.355469 339.742188 L 57.023438 339.742188 Z M 57.023438 324 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,58.431373%,80%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 324 L 83.6875 324 L 83.6875 339.742188 L 70.355469 339.742188 Z M 70.355469 324 "/> +<path style="fill-rule:nonzero;fill:rgb(10.588235%,10.588235%,10.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 355.480469 L 30.355469 355.480469 L 30.355469 371.222656 L 17.023438 371.222656 Z M 17.023438 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(34.509804%,34.509804%,34.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 355.480469 L 43.6875 355.480469 L 43.6875 371.222656 L 30.355469 371.222656 Z M 30.355469 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(58.823529%,58.823529%,58.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 355.480469 L 57.023438 355.480469 L 57.023438 371.222656 L 43.691406 371.222656 Z M 43.691406 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(81.568627%,81.568627%,81.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 355.480469 L 70.355469 355.480469 L 70.355469 371.222656 L 57.023438 371.222656 Z M 57.023438 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 355.480469 L 83.6875 355.480469 L 83.6875 371.222656 L 70.355469 371.222656 Z M 70.355469 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(27.843137%,27.843137%,27.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 386.964844 L 30.355469 386.964844 L 30.355469 402.707031 L 17.023438 402.707031 Z M 17.023438 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(47.843137%,47.843137%,47.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 386.964844 L 43.6875 386.964844 L 43.6875 402.707031 L 30.355469 402.707031 Z M 30.355469 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(65.882353%,65.882353%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 386.964844 L 57.023438 386.964844 L 57.023438 402.707031 L 43.691406 402.707031 Z M 43.691406 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(80.392157%,80.392157%,80.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 386.964844 L 70.355469 386.964844 L 70.355469 402.707031 L 57.023438 402.707031 Z M 57.023438 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 386.964844 L 83.6875 386.964844 L 83.6875 402.707031 L 70.355469 402.707031 Z M 70.355469 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,24.705882%,64.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 418.445312 L 30.355469 418.445312 L 30.355469 434.1875 L 17.023438 434.1875 Z M 17.023438 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(41.568627%,46.27451%,69.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 418.445312 L 43.6875 418.445312 L 43.6875 434.1875 L 30.355469 434.1875 Z M 30.355469 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(63.137255%,65.098039%,78.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 418.445312 L 57.023438 418.445312 L 57.023438 434.1875 L 43.691406 434.1875 Z M 43.691406 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,80.392157%,85.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 418.445312 L 70.355469 418.445312 L 70.355469 434.1875 L 57.023438 434.1875 Z M 57.023438 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 418.445312 L 83.6875 418.445312 L 83.6875 434.1875 L 70.355469 434.1875 Z M 70.355469 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,21.176471%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 449.925781 L 30.355469 449.925781 L 30.355469 465.667969 L 17.023438 465.667969 Z M 17.023438 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,44.705882%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 449.925781 L 43.6875 449.925781 L 43.6875 465.667969 L 30.355469 465.667969 Z M 30.355469 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(47.45098%,67.058824%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 449.925781 L 57.023438 449.925781 L 57.023438 465.667969 L 43.691406 465.667969 Z M 43.691406 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(76.470588%,85.882353%,99.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 449.925781 L 70.355469 449.925781 L 70.355469 465.667969 L 57.023438 465.667969 Z M 57.023438 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 449.925781 L 83.6875 449.925781 L 83.6875 465.667969 L 70.355469 465.667969 Z M 70.355469 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(23.529412%,14.901961%,57.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 481.40625 L 30.355469 481.40625 L 30.355469 497.148438 L 17.023438 497.148438 Z M 17.023438 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(42.352941%,39.215686%,63.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 481.40625 L 43.6875 481.40625 L 43.6875 497.148438 L 30.355469 497.148438 Z M 30.355469 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(61.568627%,59.607843%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 481.40625 L 57.023438 481.40625 L 57.023438 497.148438 L 43.691406 497.148438 Z M 43.691406 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,78.823529%,85.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 481.40625 L 70.355469 481.40625 L 70.355469 497.148438 L 57.023438 497.148438 Z M 57.023438 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 481.40625 L 83.6875 481.40625 L 83.6875 497.148438 L 70.355469 497.148438 Z M 70.355469 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(19.215686%,13.333333%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 512.890625 L 30.355469 512.890625 L 30.355469 528.632812 L 17.023438 528.632812 Z M 17.023438 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(42.745098%,37.647059%,73.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 512.890625 L 43.6875 512.890625 L 43.6875 528.632812 L 30.355469 528.632812 Z M 30.355469 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,62.352941%,88.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 512.890625 L 57.023438 512.890625 L 57.023438 528.632812 L 43.691406 528.632812 Z M 43.691406 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,83.921569%,98.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 512.890625 L 70.355469 512.890625 L 70.355469 528.632812 L 57.023438 528.632812 Z M 57.023438 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 512.890625 L 83.6875 512.890625 L 83.6875 528.632812 L 70.355469 528.632812 Z M 70.355469 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(49.803922%,0%,5.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 544.371094 L 30.355469 544.371094 L 30.355469 560.113281 L 17.023438 560.113281 Z M 17.023438 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(66.27451%,33.72549%,35.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 544.371094 L 43.6875 544.371094 L 43.6875 560.113281 L 30.355469 560.113281 Z M 30.355469 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(79.215686%,58.039216%,58.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 544.371094 L 57.023438 544.371094 L 57.023438 560.113281 L 43.691406 560.113281 Z M 43.691406 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,79.607843%,79.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 544.371094 L 70.355469 544.371094 L 70.355469 560.113281 L 57.023438 560.113281 Z M 57.023438 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 544.371094 L 83.6875 544.371094 L 83.6875 560.113281 L 70.355469 560.113281 Z M 70.355469 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(41.176471%,0%,4.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 575.851562 L 30.355469 575.851562 L 30.355469 591.59375 L 17.023438 591.59375 Z M 17.023438 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(80%,10.980392%,18.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 575.851562 L 43.6875 575.851562 L 43.6875 591.59375 L 30.355469 591.59375 Z M 30.355469 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,43.921569%,47.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 575.851562 L 57.023438 575.851562 L 57.023438 591.59375 L 43.691406 591.59375 Z M 43.691406 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,74.509804%,75.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 575.851562 L 70.355469 575.851562 L 70.355469 591.59375 L 57.023438 591.59375 Z M 57.023438 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 575.851562 L 83.6875 575.851562 L 83.6875 591.59375 L 70.355469 591.59375 Z M 70.355469 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="117.738281" y="68.123047"/> + <use xlink:href="#glyph0-10" x="124.738281" y="68.123047"/> + <use xlink:href="#glyph0-5" x="127.738281" y="68.123047"/> + <use xlink:href="#glyph0-5" x="132.738281" y="68.123047"/> + <use xlink:href="#glyph0-21" x="137.738281" y="68.123047"/> + <use xlink:href="#glyph0-3" x="142.738281" y="68.123047"/> + <use xlink:href="#glyph0-7" x="146.738281" y="68.123047"/> + <use xlink:href="#glyph0-12" x="148.738281" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="117.738281" y="99.603516"/> + <use xlink:href="#glyph0-10" x="124.738281" y="99.603516"/> + <use xlink:href="#glyph0-5" x="127.738281" y="99.603516"/> + <use xlink:href="#glyph0-5" x="132.738281" y="99.603516"/> + <use xlink:href="#glyph0-21" x="137.738281" y="99.603516"/> + <use xlink:href="#glyph0-3" x="142.738281" y="99.603516"/> + <use xlink:href="#glyph0-7" x="146.738281" y="99.603516"/> + <use xlink:href="#glyph0-13" x="148.738281" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-33" x="117.738281" y="131.087891"/> + <use xlink:href="#glyph0-3" x="124.738281" y="131.087891"/> + <use xlink:href="#glyph0-6" x="128.738281" y="131.087891"/> + <use xlink:href="#glyph0-18" x="130.738281" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="117.738281" y="162.568359"/> + <use xlink:href="#glyph0-30" x="123.738281" y="162.568359"/> + <use xlink:href="#glyph0-10" x="128.738281" y="162.568359"/> + <use xlink:href="#glyph0-31" x="131.738281" y="162.568359"/> + <use xlink:href="#glyph0-6" x="136.738281" y="162.568359"/> + <use xlink:href="#glyph0-5" x="138.738281" y="162.568359"/> + <use xlink:href="#glyph0-34" x="143.738281" y="162.568359"/> + <use xlink:href="#glyph0-29" x="146.738281" y="162.568359"/> + <use xlink:href="#glyph0-6" x="152.738281" y="162.568359"/> + <use xlink:href="#glyph0-30" x="154.738281" y="162.568359"/> + <use xlink:href="#glyph0-5" x="159.738281" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="117.738281" y="194.048828"/> + <use xlink:href="#glyph0-5" x="123.738281" y="194.048828"/> + <use xlink:href="#glyph0-19" x="128.738281" y="194.048828"/> + <use xlink:href="#glyph0-34" x="133.738281" y="194.048828"/> + <use xlink:href="#glyph0-1" x="136.738281" y="194.048828"/> + <use xlink:href="#glyph0-30" x="142.738281" y="194.048828"/> + <use xlink:href="#glyph0-10" x="147.738281" y="194.048828"/> + <use xlink:href="#glyph0-31" x="150.738281" y="194.048828"/> + <use xlink:href="#glyph0-6" x="155.738281" y="194.048828"/> + <use xlink:href="#glyph0-5" x="157.738281" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="117.738281" y="225.529297"/> + <use xlink:href="#glyph0-5" x="123.738281" y="225.529297"/> + <use xlink:href="#glyph0-19" x="128.738281" y="225.529297"/> + <use xlink:href="#glyph0-34" x="133.738281" y="225.529297"/> + <use xlink:href="#glyph0-29" x="136.738281" y="225.529297"/> + <use xlink:href="#glyph0-6" x="142.738281" y="225.529297"/> + <use xlink:href="#glyph0-30" x="144.738281" y="225.529297"/> + <use xlink:href="#glyph0-5" x="149.738281" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="117.738281" y="257.013672"/> + <use xlink:href="#glyph0-30" x="123.738281" y="257.013672"/> + <use xlink:href="#glyph0-10" x="128.738281" y="257.013672"/> + <use xlink:href="#glyph0-31" x="131.738281" y="257.013672"/> + <use xlink:href="#glyph0-6" x="136.738281" y="257.013672"/> + <use xlink:href="#glyph0-5" x="138.738281" y="257.013672"/> + <use xlink:href="#glyph0-34" x="143.738281" y="257.013672"/> + <use xlink:href="#glyph0-33" x="146.738281" y="257.013672"/> + <use xlink:href="#glyph0-10" x="153.738281" y="257.013672"/> + <use xlink:href="#glyph0-2" x="156.738281" y="257.013672"/> + <use xlink:href="#glyph0-21" x="161.738281" y="257.013672"/> + <use xlink:href="#glyph0-27" x="166.738281" y="257.013672"/> + <use xlink:href="#glyph0-5" x="171.738281" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="117.738281" y="288.494141"/> + <use xlink:href="#glyph0-30" x="123.738281" y="288.494141"/> + <use xlink:href="#glyph0-10" x="128.738281" y="288.494141"/> + <use xlink:href="#glyph0-31" x="131.738281" y="288.494141"/> + <use xlink:href="#glyph0-6" x="136.738281" y="288.494141"/> + <use xlink:href="#glyph0-5" x="138.738281" y="288.494141"/> + <use xlink:href="#glyph0-34" x="143.738281" y="288.494141"/> + <use xlink:href="#glyph0-35" x="145.738281" y="288.494141"/> + <use xlink:href="#glyph0-5" x="150.738281" y="288.494141"/> + <use xlink:href="#glyph0-6" x="155.738281" y="288.494141"/> + <use xlink:href="#glyph0-6" x="157.738281" y="288.494141"/> + <use xlink:href="#glyph0-18" x="159.738281" y="288.494141"/> + <use xlink:href="#glyph0-36" x="164.738281" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="117.738281" y="319.974609"/> + <use xlink:href="#glyph0-6" x="123.738281" y="319.974609"/> + <use xlink:href="#glyph0-30" x="125.738281" y="319.974609"/> + <use xlink:href="#glyph0-5" x="130.738281" y="319.974609"/> + <use xlink:href="#glyph0-34" x="135.738281" y="319.974609"/> + <use xlink:href="#glyph0-35" x="137.738281" y="319.974609"/> + <use xlink:href="#glyph0-5" x="142.738281" y="319.974609"/> + <use xlink:href="#glyph0-6" x="147.738281" y="319.974609"/> + <use xlink:href="#glyph0-6" x="149.738281" y="319.974609"/> + <use xlink:href="#glyph0-18" x="151.738281" y="319.974609"/> + <use xlink:href="#glyph0-36" x="156.738281" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="117.738281" y="351.455078"/> + <use xlink:href="#glyph0-10" x="124.738281" y="351.455078"/> + <use xlink:href="#glyph0-5" x="127.738281" y="351.455078"/> + <use xlink:href="#glyph0-5" x="132.738281" y="351.455078"/> + <use xlink:href="#glyph0-21" x="137.738281" y="351.455078"/> + <use xlink:href="#glyph0-34" x="142.738281" y="351.455078"/> + <use xlink:href="#glyph0-35" x="144.738281" y="351.455078"/> + <use xlink:href="#glyph0-5" x="149.738281" y="351.455078"/> + <use xlink:href="#glyph0-6" x="154.738281" y="351.455078"/> + <use xlink:href="#glyph0-6" x="156.738281" y="351.455078"/> + <use xlink:href="#glyph0-18" x="158.738281" y="351.455078"/> + <use xlink:href="#glyph0-36" x="163.738281" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="117.738281" y="382.939453"/> + <use xlink:href="#glyph0-5" x="123.738281" y="382.939453"/> + <use xlink:href="#glyph0-19" x="128.738281" y="382.939453"/> + <use xlink:href="#glyph0-34" x="133.738281" y="382.939453"/> + <use xlink:href="#glyph0-35" x="135.738281" y="382.939453"/> + <use xlink:href="#glyph0-5" x="140.738281" y="382.939453"/> + <use xlink:href="#glyph0-6" x="145.738281" y="382.939453"/> + <use xlink:href="#glyph0-6" x="147.738281" y="382.939453"/> + <use xlink:href="#glyph0-18" x="149.738281" y="382.939453"/> + <use xlink:href="#glyph0-36" x="154.738281" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-20" x="117.738281" y="414.419922"/> + <use xlink:href="#glyph0-5" x="123.738281" y="414.419922"/> + <use xlink:href="#glyph0-2" x="128.738281" y="414.419922"/> + <use xlink:href="#glyph0-4" x="133.738281" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-20" x="117.738281" y="445.900391"/> + <use xlink:href="#glyph0-5" x="123.738281" y="445.900391"/> + <use xlink:href="#glyph0-2" x="128.738281" y="445.900391"/> + <use xlink:href="#glyph0-4" x="133.738281" y="445.900391"/> + <use xlink:href="#glyph0-7" x="135.738281" y="445.900391"/> + <use xlink:href="#glyph0-12" x="137.738281" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="117.738281" y="477.380859"/> + <use xlink:href="#glyph0-5" x="121.738281" y="477.380859"/> + <use xlink:href="#glyph0-10" x="126.738281" y="477.380859"/> + <use xlink:href="#glyph0-10" x="129.738281" y="477.380859"/> + <use xlink:href="#glyph0-2" x="132.738281" y="477.380859"/> + <use xlink:href="#glyph0-22" x="137.738281" y="477.380859"/> + <use xlink:href="#glyph0-21" x="139.738281" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="117.738281" y="508.865234"/> + <use xlink:href="#glyph0-5" x="121.738281" y="508.865234"/> + <use xlink:href="#glyph0-10" x="126.738281" y="508.865234"/> + <use xlink:href="#glyph0-10" x="129.738281" y="508.865234"/> + <use xlink:href="#glyph0-2" x="132.738281" y="508.865234"/> + <use xlink:href="#glyph0-22" x="137.738281" y="508.865234"/> + <use xlink:href="#glyph0-21" x="139.738281" y="508.865234"/> + <use xlink:href="#glyph0-7" x="144.738281" y="508.865234"/> + <use xlink:href="#glyph0-12" x="146.738281" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-38" x="117.738281" y="540.345703"/> + <use xlink:href="#glyph0-22" x="123.738281" y="540.345703"/> + <use xlink:href="#glyph0-10" x="125.738281" y="540.345703"/> + <use xlink:href="#glyph0-22" x="128.738281" y="540.345703"/> + <use xlink:href="#glyph0-19" x="130.738281" y="540.345703"/> + <use xlink:href="#glyph0-22" x="135.738281" y="540.345703"/> + <use xlink:href="#glyph0-3" x="137.738281" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="117.738281" y="571.826172"/> + <use xlink:href="#glyph0-6" x="122.738281" y="571.826172"/> + <use xlink:href="#glyph0-2" x="124.738281" y="571.826172"/> + <use xlink:href="#glyph0-3" x="129.738281" y="571.826172"/> + <use xlink:href="#glyph0-16" x="133.738281" y="571.826172"/> + <use xlink:href="#glyph0-2" x="140.738281" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(0%,37.647059%,15.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 72.148438 L 131.070312 72.148438 L 131.070312 87.890625 L 117.738281 87.890625 Z M 117.738281 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(36.862745%,54.509804%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 72.148438 L 144.402344 72.148438 L 144.402344 87.890625 L 131.070312 87.890625 Z M 131.070312 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(60.392157%,70.196078%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 72.148438 L 157.738281 72.148438 L 157.738281 87.890625 L 144.40625 87.890625 Z M 144.40625 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(80.392157%,84.313725%,81.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 72.148438 L 171.070312 72.148438 L 171.070312 87.890625 L 157.738281 87.890625 Z M 157.738281 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 72.148438 L 184.402344 72.148438 L 184.402344 87.890625 L 171.070312 87.890625 Z M 171.070312 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,27.45098%,8.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 103.628906 L 131.070312 103.628906 L 131.070312 119.371094 L 117.738281 119.371094 Z M 117.738281 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(9.411765%,54.509804%,25.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 103.628906 L 144.402344 103.628906 L 144.402344 119.371094 L 131.070312 119.371094 Z M 131.070312 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(45.490196%,76.078431%,52.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 103.628906 L 157.738281 103.628906 L 157.738281 119.371094 L 144.40625 119.371094 Z M 144.40625 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(76.862745%,90.980392%,79.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 103.628906 L 171.070312 103.628906 L 171.070312 119.371094 L 157.738281 119.371094 Z M 157.738281 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 103.628906 L 184.402344 103.628906 L 184.402344 119.371094 L 171.070312 119.371094 Z M 171.070312 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,98.823529%,98.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 135.109375 L 131.070312 135.109375 L 131.070312 150.851562 L 117.738281 150.851562 Z M 117.738281 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(64.313725%,72.156863%,86.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 135.109375 L 144.402344 135.109375 L 144.402344 150.851562 L 131.070312 150.851562 Z M 131.070312 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(23.529412%,47.45098%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 135.109375 L 157.738281 135.109375 L 157.738281 150.851562 L 144.40625 150.851562 Z M 144.40625 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(11.372549%,24.313725%,39.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 135.109375 L 171.070312 135.109375 L 171.070312 150.851562 L 157.738281 150.851562 Z M 157.738281 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(1.568627%,1.568627%,1.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 135.109375 L 184.402344 135.109375 L 184.402344 150.851562 L 171.070312 150.851562 Z M 171.070312 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(41.960784%,0%,46.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 166.59375 L 131.070312 166.59375 L 131.070312 182.335938 L 117.738281 182.335938 Z M 117.738281 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(46.27451%,39.607843%,64.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 166.59375 L 144.402344 166.59375 L 144.402344 182.335938 L 131.070312 182.335938 Z M 131.070312 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(55.294118%,63.921569%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 166.59375 L 157.738281 166.59375 L 157.738281 182.335938 L 144.40625 182.335938 Z M 144.40625 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(71.764706%,83.529412%,89.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 166.59375 L 171.070312 166.59375 L 171.070312 182.335938 L 157.738281 182.335938 Z M 157.738281 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 166.59375 L 184.402344 166.59375 L 184.402344 182.335938 L 171.070312 182.335938 Z M 171.070312 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,0.392157%,7.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 198.074219 L 131.070312 198.074219 L 131.070312 213.816406 L 117.738281 213.816406 Z M 117.738281 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(70.196078%,29.019608%,47.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 198.074219 L 144.402344 198.074219 L 144.402344 213.816406 L 131.070312 213.816406 Z M 131.070312 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,54.117647%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 198.074219 L 157.738281 198.074219 L 157.738281 213.816406 L 144.40625 213.816406 Z M 144.40625 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,76.862745%,93.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 198.074219 L 171.070312 198.074219 L 171.070312 213.816406 L 157.738281 213.816406 Z M 157.738281 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,94.117647%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 198.074219 L 184.402344 198.074219 L 184.402344 213.816406 L 171.070312 213.816406 Z M 171.070312 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(66.27451%,19.215686%,32.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 229.554688 L 131.070312 229.554688 L 131.070312 245.296875 L 117.738281 245.296875 Z M 117.738281 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(72.941176%,29.411765%,55.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 229.554688 L 144.402344 229.554688 L 144.402344 245.296875 L 131.070312 245.296875 Z M 131.070312 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(73.72549%,43.137255%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 229.554688 L 157.738281 229.554688 L 157.738281 245.296875 L 144.40625 245.296875 Z M 144.40625 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(70.588235%,58.039216%,83.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 229.554688 L 171.070312 229.554688 L 171.070312 245.296875 L 157.738281 245.296875 Z M 157.738281 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(68.235294%,71.372549%,89.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 229.554688 L 184.402344 229.554688 L 184.402344 245.296875 L 171.070312 245.296875 Z M 171.070312 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(35.686275%,21.568627%,58.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 261.035156 L 131.070312 261.035156 L 131.070312 276.777344 L 117.738281 276.777344 Z M 117.738281 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(60%,32.54902%,63.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 261.035156 L 144.402344 261.035156 L 144.402344 276.777344 L 131.070312 276.777344 Z M 131.070312 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(78.431373%,47.843137%,67.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 261.035156 L 157.738281 261.035156 L 157.738281 276.777344 L 144.40625 276.777344 Z M 144.40625 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(92.156863%,65.882353%,72.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 261.035156 L 171.070312 261.035156 L 171.070312 276.777344 L 157.738281 276.777344 Z M 157.738281 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,86.27451%,85.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 261.035156 L 184.402344 261.035156 L 184.402344 276.777344 L 171.070312 276.777344 Z M 171.070312 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(50.196078%,7.843137%,43.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 292.519531 L 131.070312 292.519531 L 131.070312 308.261719 L 117.738281 308.261719 Z M 117.738281 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(39.215686%,45.490196%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 292.519531 L 144.402344 292.519531 L 144.402344 308.261719 L 131.070312 308.261719 Z M 131.070312 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(20.392157%,72.156863%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 292.519531 L 157.738281 292.519531 L 157.738281 308.261719 L 144.40625 308.261719 Z M 144.40625 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(64.313725%,87.843137%,71.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 292.519531 L 171.070312 292.519531 L 171.070312 308.261719 L 157.738281 308.261719 Z M 157.738281 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,94.901961%,84.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 292.519531 L 184.402344 292.519531 L 184.402344 308.261719 L 171.070312 308.261719 Z M 171.070312 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(17.647059%,19.215686%,51.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 324 L 131.070312 324 L 131.070312 339.742188 L 117.738281 339.742188 Z M 117.738281 324 "/> +<path style="fill-rule:nonzero;fill:rgb(3.921569%,57.254902%,67.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 324 L 144.402344 324 L 144.402344 339.742188 L 131.070312 339.742188 Z M 131.070312 324 "/> +<path style="fill-rule:nonzero;fill:rgb(46.666667%,81.176471%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 324 L 157.738281 324 L 157.738281 339.742188 L 144.40625 339.742188 Z M 144.40625 324 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,92.941176%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 324 L 171.070312 324 L 171.070312 339.742188 L 157.738281 339.742188 Z M 157.738281 324 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,94.509804%,89.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 324 L 184.402344 324 L 184.402344 339.742188 L 171.070312 339.742188 Z M 171.070312 324 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,43.137255%,21.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 355.480469 L 131.070312 355.480469 L 131.070312 371.222656 L 117.738281 371.222656 Z M 117.738281 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(45.490196%,64.705882%,43.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 355.480469 L 144.402344 355.480469 L 144.402344 371.222656 L 131.070312 371.222656 Z M 131.070312 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(71.764706%,81.568627%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 355.480469 L 157.738281 355.480469 L 157.738281 371.222656 L 144.40625 371.222656 Z M 144.40625 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(90.196078%,92.941176%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 355.480469 L 171.070312 355.480469 L 171.070312 371.222656 L 157.738281 371.222656 Z M 157.738281 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,96.862745%,91.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 355.480469 L 184.402344 355.480469 L 184.402344 371.222656 L 171.070312 371.222656 Z M 171.070312 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,0.392157%,7.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 386.964844 L 131.070312 386.964844 L 131.070312 402.707031 L 117.738281 402.707031 Z M 117.738281 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(66.666667%,34.901961%,17.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 386.964844 L 144.402344 386.964844 L 144.402344 402.707031 L 131.070312 402.707031 Z M 131.070312 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(80.784314%,59.215686%,34.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 386.964844 L 157.738281 386.964844 L 157.738281 402.707031 L 144.40625 402.707031 Z M 144.40625 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(90.980392%,80.784314%,56.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 386.964844 L 171.070312 386.964844 L 171.070312 402.707031 L 157.738281 402.707031 Z M 157.738281 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,94.509804%,89.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 386.964844 L 184.402344 386.964844 L 184.402344 402.707031 L 171.070312 402.707031 Z M 171.070312 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(55.686275%,2.352941%,23.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 418.445312 L 131.070312 418.445312 L 131.070312 434.1875 L 117.738281 434.1875 Z M 117.738281 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,42.745098%,32.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 418.445312 L 144.402344 418.445312 L 144.402344 434.1875 L 131.070312 434.1875 Z M 131.070312 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(93.333333%,67.058824%,39.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 418.445312 L 157.738281 418.445312 L 157.738281 434.1875 L 144.40625 434.1875 Z M 144.40625 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,83.529412%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 418.445312 L 171.070312 418.445312 L 171.070312 434.1875 L 157.738281 434.1875 Z M 157.738281 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,90.196078%,74.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 418.445312 L 184.402344 418.445312 L 184.402344 434.1875 L 171.070312 434.1875 Z M 171.070312 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,24.705882%,41.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 449.925781 L 131.070312 449.925781 L 131.070312 465.667969 L 117.738281 465.667969 Z M 117.738281 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(88.235294%,43.921569%,29.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 449.925781 L 144.402344 449.925781 L 144.402344 465.667969 L 131.070312 465.667969 Z M 131.070312 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,60.392157%,17.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 449.925781 L 157.738281 449.925781 L 157.738281 465.667969 L 144.40625 465.667969 Z M 144.40625 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(90.980392%,76.470588%,23.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 449.925781 L 171.070312 449.925781 L 171.070312 465.667969 L 157.738281 465.667969 Z M 157.738281 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,90.196078%,74.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 449.925781 L 184.402344 449.925781 L 184.402344 465.667969 L 171.070312 465.667969 Z M 171.070312 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(14.901961%,65.098039%,22.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 481.40625 L 131.070312 481.40625 L 131.070312 497.148438 L 117.738281 497.148438 Z M 117.738281 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(60.784314%,70.196078%,2.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 481.40625 L 144.402344 481.40625 L 144.402344 497.148438 L 131.070312 497.148438 Z M 131.070312 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(88.235294%,73.333333%,30.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 481.40625 L 157.738281 481.40625 L 157.738281 497.148438 L 144.40625 497.148438 Z M 144.40625 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,77.254902%,61.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 481.40625 L 171.070312 481.40625 L 171.070312 497.148438 L 157.738281 497.148438 Z M 157.738281 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 481.40625 L 184.402344 481.40625 L 184.402344 497.148438 L 171.070312 497.148438 Z M 171.070312 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,48.627451%,11.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 512.890625 L 131.070312 512.890625 L 131.070312 528.632812 L 117.738281 528.632812 Z M 117.738281 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(49.803922%,61.568627%,26.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 512.890625 L 144.402344 512.890625 L 144.402344 528.632812 L 131.070312 528.632812 Z M 131.070312 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(75.294118%,72.156863%,47.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 512.890625 L 157.738281 512.890625 L 157.738281 528.632812 L 144.40625 528.632812 Z M 144.40625 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,80.784314%,68.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 512.890625 L 171.070312 512.890625 L 171.070312 528.632812 L 157.738281 528.632812 Z M 157.738281 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 512.890625 L 184.402344 512.890625 L 184.402344 528.632812 L 171.070312 528.632812 Z M 171.070312 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(29.411765%,0%,33.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 544.371094 L 131.070312 544.371094 L 131.070312 560.113281 L 117.738281 560.113281 Z M 117.738281 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,34.509804%,54.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 544.371094 L 144.402344 544.371094 L 144.402344 560.113281 L 131.070312 560.113281 Z M 131.070312 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,60.784314%,58.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 544.371094 L 157.738281 544.371094 L 157.738281 560.113281 L 144.40625 560.113281 Z M 144.40625 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(32.54902%,80%,40.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 544.371094 L 171.070312 544.371094 L 171.070312 560.113281 L 157.738281 560.113281 Z M 157.738281 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(99.215686%,89.019608%,20%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 544.371094 L 184.402344 544.371094 L 184.402344 560.113281 L 171.070312 560.113281 Z M 171.070312 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,9.411765%,53.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 575.851562 L 131.070312 575.851562 L 131.070312 591.59375 L 117.738281 591.59375 Z M 117.738281 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(56.862745%,0%,55.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 575.851562 L 144.402344 575.851562 L 144.402344 591.59375 L 131.070312 591.59375 Z M 131.070312 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(82.352941%,30.588235%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 575.851562 L 157.738281 575.851562 L 157.738281 591.59375 L 144.40625 591.59375 Z M 144.40625 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,63.529412%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 575.851562 L 171.070312 575.851562 L 171.070312 591.59375 L 157.738281 591.59375 Z M 157.738281 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,100%,27.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 575.851562 L 184.402344 575.851562 L 184.402344 591.59375 L 171.070312 591.59375 Z M 171.070312 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-39" x="218.453125" y="68.123047"/> + <use xlink:href="#glyph0-21" x="220.453125" y="68.123047"/> + <use xlink:href="#glyph0-40" x="225.453125" y="68.123047"/> + <use xlink:href="#glyph0-5" x="227.453125" y="68.123047"/> + <use xlink:href="#glyph0-10" x="232.453125" y="68.123047"/> + <use xlink:href="#glyph0-21" x="235.453125" y="68.123047"/> + <use xlink:href="#glyph0-18" x="240.453125" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="218.453125" y="99.603516"/> + <use xlink:href="#glyph0-18" x="224.453125" y="99.603516"/> + <use xlink:href="#glyph0-23" x="229.453125" y="99.603516"/> + <use xlink:href="#glyph0-11" x="233.453125" y="99.603516"/> + <use xlink:href="#glyph0-5" x="237.453125" y="99.603516"/> + <use xlink:href="#glyph0-4" x="242.453125" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-41" x="218.453125" y="131.087891"/> + <use xlink:href="#glyph0-2" x="225.453125" y="131.087891"/> + <use xlink:href="#glyph0-11" x="230.453125" y="131.087891"/> + <use xlink:href="#glyph0-18" x="234.453125" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-9" x="218.453125" y="162.568359"/> + <use xlink:href="#glyph0-2" x="224.453125" y="162.568359"/> + <use xlink:href="#glyph0-10" x="229.453125" y="162.568359"/> + <use xlink:href="#glyph0-11" x="232.453125" y="162.568359"/> + <use xlink:href="#glyph0-7" x="236.453125" y="162.568359"/> + <use xlink:href="#glyph0-41" x="238.453125" y="162.568359"/> + <use xlink:href="#glyph0-22" x="245.453125" y="162.568359"/> + <use xlink:href="#glyph0-21" x="247.453125" y="162.568359"/> + <use xlink:href="#glyph0-4" x="252.453125" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-41" x="218.453125" y="194.048828"/> + <use xlink:href="#glyph0-22" x="225.453125" y="194.048828"/> + <use xlink:href="#glyph0-21" x="227.453125" y="194.048828"/> + <use xlink:href="#glyph0-4" x="232.453125" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="218.453125" y="225.529297"/> + <use xlink:href="#glyph0-6" x="224.453125" y="225.529297"/> + <use xlink:href="#glyph0-30" x="226.453125" y="225.529297"/> + <use xlink:href="#glyph0-25" x="231.453125" y="225.529297"/> + <use xlink:href="#glyph0-10" x="238.453125" y="225.529297"/> + <use xlink:href="#glyph0-21" x="241.453125" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="218.453125" y="257.013672"/> + <use xlink:href="#glyph0-5" x="222.453125" y="257.013672"/> + <use xlink:href="#glyph0-2" x="227.453125" y="257.013672"/> + <use xlink:href="#glyph0-6" x="232.453125" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="218.453125" y="288.494141"/> + <use xlink:href="#glyph0-5" x="222.453125" y="288.494141"/> + <use xlink:href="#glyph0-2" x="227.453125" y="288.494141"/> + <use xlink:href="#glyph0-6" x="232.453125" y="288.494141"/> + <use xlink:href="#glyph0-25" x="234.453125" y="288.494141"/> + <use xlink:href="#glyph0-10" x="241.453125" y="288.494141"/> + <use xlink:href="#glyph0-21" x="244.453125" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-42" x="218.453125" y="319.974609"/> + <use xlink:href="#glyph0-16" x="224.453125" y="319.974609"/> + <use xlink:href="#glyph0-10" x="231.453125" y="319.974609"/> + <use xlink:href="#glyph0-6" x="234.453125" y="319.974609"/> + <use xlink:href="#glyph0-19" x="236.453125" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="218.453125" y="351.455078"/> + <use xlink:href="#glyph0-6" x="224.453125" y="351.455078"/> + <use xlink:href="#glyph0-30" x="226.453125" y="351.455078"/> + <use xlink:href="#glyph0-35" x="231.453125" y="351.455078"/> + <use xlink:href="#glyph0-6" x="237.453125" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-2" x="218.453125" y="382.939453"/> + <use xlink:href="#glyph0-27" x="223.453125" y="382.939453"/> + <use xlink:href="#glyph0-43" x="228.453125" y="382.939453"/> + <use xlink:href="#glyph0-25" x="233.453125" y="382.939453"/> + <use xlink:href="#glyph0-10" x="240.453125" y="382.939453"/> + <use xlink:href="#glyph0-21" x="243.453125" y="382.939453"/> + <use xlink:href="#glyph0-35" x="248.453125" y="382.939453"/> + <use xlink:href="#glyph0-6" x="254.453125" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="218.453125" y="414.419922"/> + <use xlink:href="#glyph0-5" x="223.453125" y="414.419922"/> + <use xlink:href="#glyph0-2" x="228.453125" y="414.419922"/> + <use xlink:href="#glyph0-23" x="233.453125" y="414.419922"/> + <use xlink:href="#glyph0-28" x="237.453125" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="218.453125" y="445.900391"/> + <use xlink:href="#glyph0-22" x="223.453125" y="445.900391"/> + <use xlink:href="#glyph0-21" x="225.453125" y="445.900391"/> + <use xlink:href="#glyph0-11" x="230.453125" y="445.900391"/> + <use xlink:href="#glyph0-35" x="234.453125" y="445.900391"/> + <use xlink:href="#glyph0-6" x="240.453125" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="218.453125" y="477.380859"/> + <use xlink:href="#glyph0-30" x="224.453125" y="477.380859"/> + <use xlink:href="#glyph0-10" x="229.453125" y="477.380859"/> + <use xlink:href="#glyph0-27" x="232.453125" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="218.453125" y="508.865234"/> + <use xlink:href="#glyph0-30" x="224.453125" y="508.865234"/> + <use xlink:href="#glyph0-10" x="229.453125" y="508.865234"/> + <use xlink:href="#glyph0-27" x="232.453125" y="508.865234"/> + <use xlink:href="#glyph0-35" x="237.453125" y="508.865234"/> + <use xlink:href="#glyph0-6" x="243.453125" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="218.453125" y="540.345703"/> + <use xlink:href="#glyph0-5" x="224.453125" y="540.345703"/> + <use xlink:href="#glyph0-19" x="229.453125" y="540.345703"/> + <use xlink:href="#glyph0-33" x="234.453125" y="540.345703"/> + <use xlink:href="#glyph0-10" x="241.453125" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-33" x="218.453125" y="571.826172"/> + <use xlink:href="#glyph0-10" x="225.453125" y="571.826172"/> + <use xlink:href="#glyph0-35" x="228.453125" y="571.826172"/> + <use xlink:href="#glyph0-5" x="233.453125" y="571.826172"/> + <use xlink:href="#glyph0-6" x="238.453125" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(1.568627%,1.568627%,1.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 72.148438 L 231.785156 72.148438 L 231.785156 87.890625 L 218.453125 87.890625 Z M 218.453125 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(38.039216%,6.666667%,38.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 72.148438 L 245.117188 72.148438 L 245.117188 87.890625 L 231.785156 87.890625 Z M 231.785156 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(77.254902%,19.607843%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 72.148438 L 258.449219 72.148438 L 258.449219 87.890625 L 245.117188 87.890625 Z M 245.117188 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,58.039216%,13.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 72.148438 L 271.785156 72.148438 L 271.785156 87.890625 L 258.453125 87.890625 Z M 258.453125 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,99.607843%,61.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 72.148438 L 285.117188 72.148438 L 285.117188 87.890625 L 271.785156 87.890625 Z M 271.785156 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(2.745098%,2.745098%,2.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 103.628906 L 231.785156 103.628906 L 231.785156 119.371094 L 218.453125 119.371094 Z M 218.453125 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(41.176471%,0%,33.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 103.628906 L 245.117188 103.628906 L 245.117188 119.371094 L 231.785156 119.371094 Z M 231.785156 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(76.470588%,5.490196%,38.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 103.628906 L 258.449219 103.628906 L 258.449219 119.371094 L 245.117188 119.371094 Z M 245.117188 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,51.372549%,32.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 103.628906 L 271.785156 103.628906 L 271.785156 119.371094 L 258.453125 119.371094 Z M 258.453125 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(99.215686%,96.078431%,92.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 103.628906 L 285.117188 103.628906 L 285.117188 119.371094 L 271.785156 119.371094 Z M 271.785156 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(2.745098%,2.745098%,2.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 135.109375 L 231.785156 135.109375 L 231.785156 150.851562 L 218.453125 150.851562 Z M 218.453125 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(25.882353%,20.392157%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 135.109375 L 245.117188 135.109375 L 245.117188 150.851562 L 231.785156 150.851562 Z M 231.785156 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,49.803922%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 135.109375 L 258.449219 135.109375 L 258.449219 150.851562 L 245.117188 150.851562 Z M 245.117188 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(28.235294%,76.078431%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 135.109375 L 271.785156 135.109375 L 271.785156 150.851562 L 258.453125 150.851562 Z M 258.453125 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(87.843137%,96.862745%,88.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 135.109375 L 285.117188 135.109375 L 285.117188 150.851562 L 271.785156 150.851562 Z M 271.785156 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(5.490196%,24.705882%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 166.59375 L 231.785156 166.59375 L 231.785156 182.335938 L 218.453125 182.335938 Z M 218.453125 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(16.470588%,42.745098%,47.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 166.59375 L 245.117188 166.59375 L 245.117188 182.335938 L 231.785156 182.335938 Z M 231.785156 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(34.117647%,61.176471%,59.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 166.59375 L 258.449219 166.59375 L 258.449219 182.335938 L 245.117188 182.335938 Z M 245.117188 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(56.078431%,80%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 166.59375 L 271.785156 166.59375 L 271.785156 182.335938 L 258.453125 182.335938 Z M 258.453125 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(81.960784%,98.431373%,83.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 166.59375 L 285.117188 166.59375 L 285.117188 182.335938 L 271.785156 182.335938 Z M 271.785156 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,36.470588%,40.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 198.074219 L 231.785156 198.074219 L 231.785156 213.816406 L 218.453125 213.816406 Z M 218.453125 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(10.588235%,50.588235%,49.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 198.074219 L 245.117188 198.074219 L 245.117188 213.816406 L 231.785156 213.816406 Z M 231.785156 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(39.215686%,65.490196%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 198.074219 L 258.449219 198.074219 L 258.449219 213.816406 L 245.117188 213.816406 Z M 245.117188 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(62.352941%,80.784314%,72.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 198.074219 L 271.785156 198.074219 L 271.785156 213.816406 L 258.453125 213.816406 Z M 258.453125 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(87.843137%,94.901961%,90.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 198.074219 L 285.117188 198.074219 L 285.117188 213.816406 L 271.785156 213.816406 Z M 271.785156 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(7.843137%,31.372549%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 229.554688 L 231.785156 229.554688 L 231.785156 245.296875 L 218.453125 245.296875 Z M 218.453125 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(16.470588%,47.45098%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 229.554688 L 245.117188 229.554688 L 245.117188 245.296875 L 231.785156 245.296875 Z M 231.785156 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(29.803922%,63.921569%,56.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 229.554688 L 258.449219 229.554688 L 258.449219 245.296875 L 245.117188 245.296875 Z M 245.117188 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(50.588235%,79.215686%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 229.554688 L 271.785156 229.554688 L 271.785156 245.296875 L 258.453125 245.296875 Z M 258.453125 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,89.803922%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 229.554688 L 285.117188 229.554688 L 285.117188 245.296875 L 271.785156 245.296875 Z M 271.785156 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(16.470588%,33.72549%,46.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 261.035156 L 231.785156 261.035156 L 231.785156 276.777344 L 218.453125 276.777344 Z M 218.453125 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(23.137255%,50.196078%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 261.035156 L 245.117188 261.035156 L 245.117188 276.777344 L 231.785156 276.777344 Z M 231.785156 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(40.392157%,66.27451%,71.372549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 261.035156 L 258.449219 261.035156 L 258.449219 276.777344 L 245.117188 276.777344 Z M 245.117188 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(60%,81.176471%,81.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 261.035156 L 271.785156 261.035156 L 271.785156 276.777344 L 258.453125 276.777344 Z M 258.453125 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(82.352941%,93.333333%,91.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 261.035156 L 285.117188 261.035156 L 285.117188 276.777344 L 271.785156 276.777344 Z M 271.785156 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(9.019608%,49.803922%,59.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 292.519531 L 231.785156 292.519531 L 231.785156 308.261719 L 218.453125 308.261719 Z M 218.453125 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,64.313725%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 292.519531 L 245.117188 292.519531 L 245.117188 308.261719 L 231.785156 308.261719 Z M 231.785156 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(18.039216%,77.647059%,68.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 292.519531 L 258.449219 292.519531 L 258.449219 308.261719 L 245.117188 308.261719 Z M 245.117188 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(44.705882%,88.627451%,67.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 292.519531 L 271.785156 292.519531 L 271.785156 308.261719 L 258.453125 308.261719 Z M 258.453125 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(71.764706%,94.509804%,69.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 292.519531 L 285.117188 292.519531 L 285.117188 308.261719 L 271.785156 308.261719 Z M 271.785156 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(4.313725%,25.490196%,31.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 324 L 231.785156 324 L 231.785156 339.742188 L 218.453125 339.742188 Z M 218.453125 324 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,43.137255%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 324 L 245.117188 324 L 245.117188 339.742188 L 231.785156 339.742188 Z M 231.785156 324 "/> +<path style="fill-rule:nonzero;fill:rgb(19.607843%,61.568627%,51.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 324 L 258.449219 324 L 258.449219 339.742188 L 245.117188 339.742188 Z M 245.117188 324 "/> +<path style="fill-rule:nonzero;fill:rgb(50.196078%,79.215686%,56.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 324 L 271.785156 324 L 271.785156 339.742188 L 258.453125 339.742188 Z M 258.453125 324 "/> +<path style="fill-rule:nonzero;fill:rgb(83.137255%,95.294118%,63.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 324 L 285.117188 324 L 285.117188 339.742188 L 271.785156 339.742188 Z M 271.785156 324 "/> +<path style="fill-rule:nonzero;fill:rgb(18.039216%,30.980392%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 355.480469 L 231.785156 355.480469 L 231.785156 371.222656 L 218.453125 371.222656 Z M 218.453125 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,50.588235%,56.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 355.480469 L 245.117188 355.480469 L 245.117188 371.222656 L 231.785156 371.222656 Z M 231.785156 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(27.45098%,69.019608%,60.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 355.480469 L 258.449219 355.480469 L 258.449219 371.222656 L 245.117188 371.222656 Z M 245.117188 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(61.176471%,85.490196%,63.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 355.480469 L 271.785156 355.480469 L 271.785156 371.222656 L 258.453125 371.222656 Z M 258.453125 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,100%,68.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 355.480469 L 285.117188 355.480469 L 285.117188 371.222656 L 271.785156 371.222656 Z M 271.785156 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(14.509804%,33.72549%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 386.964844 L 231.785156 386.964844 L 231.785156 402.707031 L 218.453125 402.707031 Z M 218.453125 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,49.411765%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 386.964844 L 245.117188 386.964844 L 245.117188 402.707031 L 231.785156 402.707031 Z M 231.785156 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(9.019608%,65.490196%,49.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 386.964844 L 258.449219 386.964844 L 258.449219 402.707031 L 245.117188 402.707031 Z M 245.117188 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(50.980392%,80%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 386.964844 L 271.785156 386.964844 L 271.785156 402.707031 L 258.453125 402.707031 Z M 258.453125 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,93.72549%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 386.964844 L 285.117188 386.964844 L 285.117188 402.707031 L 271.785156 402.707031 Z M 271.785156 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,29.803922%,23.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 418.445312 L 231.785156 418.445312 L 231.785156 434.1875 L 218.453125 434.1875 Z M 218.453125 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,48.235294%,31.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 418.445312 L 245.117188 418.445312 L 245.117188 434.1875 L 231.785156 434.1875 Z M 231.785156 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,63.137255%,45.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 418.445312 L 258.449219 418.445312 L 258.449219 434.1875 L 245.117188 434.1875 Z M 245.117188 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,76.078431%,61.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 418.445312 L 271.785156 418.445312 L 271.785156 434.1875 L 258.453125 434.1875 Z M 258.453125 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(98.039216%,86.666667%,76.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 418.445312 L 285.117188 418.445312 L 285.117188 434.1875 L 271.785156 434.1875 Z M 271.785156 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,29.803922%,50.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 449.925781 L 231.785156 449.925781 L 231.785156 465.667969 L 218.453125 465.667969 Z M 218.453125 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,49.411765%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 449.925781 L 245.117188 449.925781 L 245.117188 465.667969 L 231.785156 465.667969 Z M 231.785156 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,66.27451%,44.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 449.925781 L 258.449219 449.925781 L 258.449219 465.667969 L 245.117188 465.667969 Z M 245.117188 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(98.039216%,81.960784%,54.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 449.925781 L 271.785156 449.925781 L 271.785156 465.667969 L 258.453125 465.667969 Z M 258.453125 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(99.215686%,96.470588%,70.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 449.925781 L 285.117188 449.925781 L 285.117188 465.667969 L 271.785156 465.667969 Z M 271.785156 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(40.392157%,13.333333%,24.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 481.40625 L 231.785156 481.40625 L 231.785156 497.148438 L 218.453125 497.148438 Z M 218.453125 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(61.176471%,24.313725%,36.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 481.40625 L 245.117188 481.40625 L 245.117188 497.148438 L 231.785156 497.148438 Z M 231.785156 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,38.431373%,48.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 481.40625 L 258.449219 481.40625 L 258.449219 497.148438 L 245.117188 497.148438 Z M 245.117188 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(90.196078%,58.431373%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 481.40625 L 271.785156 481.40625 L 271.785156 497.148438 L 258.453125 497.148438 Z M 258.453125 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,77.254902%,78.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 481.40625 L 285.117188 481.40625 L 285.117188 497.148438 L 271.785156 497.148438 Z M 271.785156 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(46.666667%,17.254902%,29.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 512.890625 L 231.785156 512.890625 L 231.785156 528.632812 L 218.453125 528.632812 Z M 218.453125 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,30.980392%,35.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 512.890625 L 245.117188 512.890625 L 245.117188 528.632812 L 231.785156 528.632812 Z M 231.785156 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,46.27451%,36.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 512.890625 L 258.449219 512.890625 L 258.449219 528.632812 L 245.117188 528.632812 Z M 245.117188 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,66.666667%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 512.890625 L 271.785156 512.890625 L 271.785156 528.632812 L 258.453125 528.632812 Z M 258.453125 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,87.45098%,75.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 512.890625 L 285.117188 512.890625 L 285.117188 528.632812 L 271.785156 528.632812 Z M 271.785156 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(69.411765%,24.705882%,38.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 544.371094 L 231.785156 544.371094 L 231.785156 560.113281 L 218.453125 560.113281 Z M 218.453125 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,36.470588%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 544.371094 L 245.117188 544.371094 L 245.117188 560.113281 L 231.785156 560.113281 Z M 231.785156 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(89.019608%,52.156863%,40%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 544.371094 L 258.449219 544.371094 L 258.449219 560.113281 L 245.117188 560.113281 Z M 245.117188 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(93.333333%,67.45098%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 544.371094 L 271.785156 544.371094 L 271.785156 560.113281 L 258.453125 560.113281 Z M 258.453125 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,81.960784%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 544.371094 L 285.117188 544.371094 L 285.117188 560.113281 L 271.785156 560.113281 Z M 271.785156 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,28.235294%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 575.851562 L 231.785156 575.851562 L 231.785156 591.59375 L 218.453125 591.59375 Z M 218.453125 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,45.490196%,30.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 575.851562 L 245.117188 575.851562 L 245.117188 591.59375 L 231.785156 591.59375 Z M 231.785156 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,60.784314%,29.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 575.851562 L 258.449219 575.851562 L 258.449219 591.59375 L 245.117188 591.59375 Z M 245.117188 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,73.72549%,41.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 575.851562 L 271.785156 575.851562 L 271.785156 591.59375 L 258.453125 591.59375 Z M 258.453125 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(92.54902%,85.098039%,60%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 575.851562 L 285.117188 575.851562 L 285.117188 591.59375 L 271.785156 591.59375 Z M 271.785156 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="319.167969" y="68.123047"/> + <use xlink:href="#glyph0-30" x="325.167969" y="68.123047"/> + <use xlink:href="#glyph0-10" x="330.167969" y="68.123047"/> + <use xlink:href="#glyph0-31" x="333.167969" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="319.167969" y="99.603516"/> + <use xlink:href="#glyph0-30" x="325.167969" y="99.603516"/> + <use xlink:href="#glyph0-10" x="330.167969" y="99.603516"/> + <use xlink:href="#glyph0-31" x="333.167969" y="99.603516"/> + <use xlink:href="#glyph0-33" x="338.167969" y="99.603516"/> + <use xlink:href="#glyph0-10" x="345.167969" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="319.167969" y="131.087891"/> + <use xlink:href="#glyph0-30" x="325.167969" y="131.087891"/> + <use xlink:href="#glyph0-21" x="330.167969" y="131.087891"/> + <use xlink:href="#glyph0-3" x="335.167969" y="131.087891"/> + <use xlink:href="#glyph0-5" x="339.167969" y="131.087891"/> + <use xlink:href="#glyph0-4" x="344.167969" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-41" x="319.167969" y="162.568359"/> + <use xlink:href="#glyph0-2" x="326.167969" y="162.568359"/> + <use xlink:href="#glyph0-27" x="331.167969" y="162.568359"/> + <use xlink:href="#glyph0-5" x="336.167969" y="162.568359"/> + <use xlink:href="#glyph0-21" x="341.167969" y="162.568359"/> + <use xlink:href="#glyph0-4" x="346.167969" y="162.568359"/> + <use xlink:href="#glyph0-2" x="348.167969" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="319.167969" y="194.048828"/> + <use xlink:href="#glyph0-30" x="325.167969" y="194.048828"/> + <use xlink:href="#glyph0-21" x="330.167969" y="194.048828"/> + <use xlink:href="#glyph0-3" x="335.167969" y="194.048828"/> + <use xlink:href="#glyph0-5" x="339.167969" y="194.048828"/> + <use xlink:href="#glyph0-4" x="344.167969" y="194.048828"/> + <use xlink:href="#glyph0-9" x="346.167969" y="194.048828"/> + <use xlink:href="#glyph0-2" x="352.167969" y="194.048828"/> + <use xlink:href="#glyph0-10" x="357.167969" y="194.048828"/> + <use xlink:href="#glyph0-11" x="360.167969" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-2" x="319.167969" y="225.529297"/> + <use xlink:href="#glyph0-27" x="324.167969" y="225.529297"/> + <use xlink:href="#glyph0-43" x="329.167969" y="225.529297"/> + <use xlink:href="#glyph0-14" x="334.167969" y="225.529297"/> + <use xlink:href="#glyph0-30" x="340.167969" y="225.529297"/> + <use xlink:href="#glyph0-21" x="345.167969" y="225.529297"/> + <use xlink:href="#glyph0-3" x="350.167969" y="225.529297"/> + <use xlink:href="#glyph0-5" x="354.167969" y="225.529297"/> + <use xlink:href="#glyph0-4" x="359.167969" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="319.167969" y="257.013672"/> + <use xlink:href="#glyph0-10" x="325.167969" y="257.013672"/> + <use xlink:href="#glyph0-36" x="328.167969" y="257.013672"/> + <use xlink:href="#glyph0-21" x="334.167969" y="257.013672"/> + <use xlink:href="#glyph0-35" x="339.167969" y="257.013672"/> + <use xlink:href="#glyph0-6" x="345.167969" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-35" x="319.167969" y="288.494141"/> + <use xlink:href="#glyph0-6" x="325.167969" y="288.494141"/> + <use xlink:href="#glyph0-33" x="327.167969" y="288.494141"/> + <use xlink:href="#glyph0-10" x="334.167969" y="288.494141"/> + <use xlink:href="#glyph0-32" x="337.167969" y="288.494141"/> + <use xlink:href="#glyph0-19" x="343.167969" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-35" x="319.167969" y="319.974609"/> + <use xlink:href="#glyph0-6" x="325.167969" y="319.974609"/> + <use xlink:href="#glyph0-33" x="327.167969" y="319.974609"/> + <use xlink:href="#glyph0-10" x="334.167969" y="319.974609"/> + <use xlink:href="#glyph0-29" x="337.167969" y="319.974609"/> + <use xlink:href="#glyph0-10" x="343.167969" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-33" x="319.167969" y="351.455078"/> + <use xlink:href="#glyph0-10" x="326.167969" y="351.455078"/> + <use xlink:href="#glyph0-32" x="329.167969" y="351.455078"/> + <use xlink:href="#glyph0-19" x="335.167969" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-33" x="319.167969" y="382.939453"/> + <use xlink:href="#glyph0-10" x="326.167969" y="382.939453"/> + <use xlink:href="#glyph0-2" x="329.167969" y="382.939453"/> + <use xlink:href="#glyph0-21" x="334.167969" y="382.939453"/> + <use xlink:href="#glyph0-27" x="339.167969" y="382.939453"/> + <use xlink:href="#glyph0-5" x="344.167969" y="382.939453"/> + <use xlink:href="#glyph0-3" x="349.167969" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-35" x="319.167969" y="414.419922"/> + <use xlink:href="#glyph0-6" x="325.167969" y="414.419922"/> + <use xlink:href="#glyph0-25" x="327.167969" y="414.419922"/> + <use xlink:href="#glyph0-21" x="334.167969" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-35" x="319.167969" y="445.900391"/> + <use xlink:href="#glyph0-6" x="325.167969" y="445.900391"/> + <use xlink:href="#glyph0-25" x="327.167969" y="445.900391"/> + <use xlink:href="#glyph0-21" x="334.167969" y="445.900391"/> + <use xlink:href="#glyph0-29" x="339.167969" y="445.900391"/> + <use xlink:href="#glyph0-30" x="345.167969" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="319.167969" y="477.380859"/> + <use xlink:href="#glyph0-5" x="325.167969" y="477.380859"/> + <use xlink:href="#glyph0-19" x="330.167969" y="477.380859"/> + <use xlink:href="#glyph0-3" x="335.167969" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="319.167969" y="508.865234"/> + <use xlink:href="#glyph0-19" x="325.167969" y="508.865234"/> + <use xlink:href="#glyph0-1" x="330.167969" y="508.865234"/> + <use xlink:href="#glyph0-30" x="336.167969" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="319.167969" y="540.345703"/> + <use xlink:href="#glyph0-30" x="325.167969" y="540.345703"/> + <use xlink:href="#glyph0-32" x="330.167969" y="540.345703"/> + <use xlink:href="#glyph0-19" x="336.167969" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="319.167969" y="571.826172"/> + <use xlink:href="#glyph0-30" x="325.167969" y="571.826172"/> + <use xlink:href="#glyph0-10" x="330.167969" y="571.826172"/> + <use xlink:href="#glyph0-31" x="333.167969" y="571.826172"/> + <use xlink:href="#glyph0-6" x="338.167969" y="571.826172"/> + <use xlink:href="#glyph0-5" x="340.167969" y="571.826172"/> + <use xlink:href="#glyph0-3" x="345.167969" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(39.215686%,35.294118%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 72.148438 L 332.5 72.148438 L 332.5 87.890625 L 319.167969 87.890625 Z M 319.167969 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(56.078431%,45.882353%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 72.148438 L 345.832031 72.148438 L 345.832031 87.890625 L 332.5 87.890625 Z M 332.5 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(71.372549%,58.823529%,83.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 72.148438 L 359.164062 72.148438 L 359.164062 87.890625 L 345.832031 87.890625 Z M 345.832031 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,72.54902%,92.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 72.148438 L 372.5 72.148438 L 372.5 87.890625 L 359.167969 87.890625 Z M 359.167969 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,88.627451%,98.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 72.148438 L 385.832031 72.148438 L 385.832031 87.890625 L 372.5 87.890625 Z M 372.5 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(34.509804%,23.529412%,53.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 103.628906 L 332.5 103.628906 L 332.5 119.371094 L 319.167969 119.371094 Z M 319.167969 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(61.568627%,31.372549%,65.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 103.628906 L 345.832031 103.628906 L 345.832031 119.371094 L 332.5 119.371094 Z M 332.5 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(80%,47.058824%,68.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 103.628906 L 359.164062 103.628906 L 359.164062 119.371094 L 345.832031 119.371094 Z M 345.832031 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,65.490196%,72.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 103.628906 L 372.5 103.628906 L 372.5 119.371094 L 359.167969 119.371094 Z M 359.167969 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,86.27451%,85.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 103.628906 L 385.832031 103.628906 L 385.832031 119.371094 L 372.5 119.371094 Z M 372.5 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(43.921569%,30.196078%,61.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 135.109375 L 332.5 135.109375 L 332.5 150.851562 L 319.167969 150.851562 Z M 319.167969 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(73.72549%,35.294118%,66.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 135.109375 L 345.832031 135.109375 L 345.832031 150.851562 L 332.5 150.851562 Z M 332.5 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,48.627451%,59.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 135.109375 L 359.164062 135.109375 L 359.164062 150.851562 L 345.832031 150.851562 Z M 345.832031 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,69.803922%,50.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 135.109375 L 372.5 135.109375 L 372.5 150.851562 L 359.167969 150.851562 Z M 359.167969 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,90.588235%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 135.109375 L 385.832031 135.109375 L 385.832031 150.851562 L 372.5 150.851562 Z M 372.5 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(42.745098%,10.980392%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 166.59375 L 332.5 166.59375 L 332.5 182.335938 L 319.167969 182.335938 Z M 319.167969 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(61.960784%,26.27451%,52.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 166.59375 L 345.832031 166.59375 L 345.832031 182.335938 L 332.5 182.335938 Z M 332.5 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,42.352941%,63.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 166.59375 L 359.164062 166.59375 L 359.164062 182.335938 L 345.832031 182.335938 Z M 345.832031 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,60.784314%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 166.59375 L 372.5 166.59375 L 372.5 182.335938 L 359.167969 182.335938 Z M 359.167969 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,79.215686%,82.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 166.59375 L 385.832031 166.59375 L 385.832031 182.335938 L 372.5 182.335938 Z M 372.5 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,11.372549%,40.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 198.074219 L 332.5 198.074219 L 332.5 213.816406 L 319.167969 213.816406 Z M 319.167969 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(76.078431%,16.862745%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 198.074219 L 345.832031 198.074219 L 345.832031 213.816406 L 332.5 213.816406 Z M 332.5 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,35.294118%,42.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 198.074219 L 359.164062 198.074219 L 359.164062 213.816406 L 345.832031 213.816406 Z M 345.832031 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,62.745098%,46.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 198.074219 L 372.5 198.074219 L 372.5 213.816406 L 359.167969 213.816406 Z M 359.167969 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,85.098039%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 198.074219 L 385.832031 198.074219 L 385.832031 213.816406 L 372.5 213.816406 Z M 372.5 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(29.411765%,11.372549%,56.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 229.554688 L 332.5 229.554688 L 332.5 245.296875 L 319.167969 245.296875 Z M 319.167969 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(65.882353%,7.45098%,61.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 229.554688 L 345.832031 229.554688 L 345.832031 245.296875 L 332.5 245.296875 Z M 332.5 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(89.803922%,27.843137%,52.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 229.554688 L 359.164062 229.554688 L 359.164062 245.296875 L 345.832031 245.296875 Z M 345.832031 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,57.647059%,37.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 229.554688 L 372.5 229.554688 L 372.5 245.296875 L 359.167969 245.296875 Z M 359.167969 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(90.588235%,82.745098%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 229.554688 L 385.832031 229.554688 L 385.832031 245.296875 L 372.5 245.296875 Z M 372.5 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(32.941176%,10.980392%,22.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 261.035156 L 332.5 261.035156 L 332.5 276.777344 L 319.167969 276.777344 Z M 319.167969 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(55.294118%,27.45098%,32.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 261.035156 L 345.832031 261.035156 L 345.832031 276.777344 L 332.5 276.777344 Z M 332.5 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(74.117647%,47.058824%,39.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 261.035156 L 359.164062 261.035156 L 359.164062 276.777344 L 345.832031 276.777344 Z M 345.832031 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,69.411765%,56.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 261.035156 L 372.5 261.035156 L 372.5 276.777344 L 359.167969 276.777344 Z M 359.167969 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(92.156863%,88.627451%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 261.035156 L 385.832031 261.035156 L 385.832031 276.777344 L 372.5 276.777344 Z M 372.5 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,0%,14.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 292.519531 L 332.5 292.519531 L 332.5 308.261719 L 319.167969 308.261719 Z M 319.167969 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,20.784314%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 292.519531 L 345.832031 292.519531 L 345.832031 308.261719 L 332.5 308.261719 Z M 332.5 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,57.647059%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 292.519531 L 359.164062 292.519531 L 359.164062 308.261719 L 345.832031 308.261719 Z M 345.832031 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,83.921569%,49.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 292.519531 L 372.5 292.519531 L 372.5 308.261719 L 359.167969 308.261719 Z M 359.167969 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,100%,78.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 292.519531 L 385.832031 292.519531 L 385.832031 308.261719 L 372.5 308.261719 Z M 372.5 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(40.784314%,15.294118%,7.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 324 L 332.5 324 L 332.5 339.742188 L 319.167969 339.742188 Z M 319.167969 324 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,36.078431%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 324 L 345.832031 324 L 345.832031 339.742188 L 332.5 339.742188 Z M 332.5 324 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,64.313725%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 324 L 359.164062 324 L 359.164062 339.742188 L 345.832031 339.742188 Z M 345.832031 324 "/> +<path style="fill-rule:nonzero;fill:rgb(98.039216%,87.843137%,58.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 324 L 372.5 324 L 372.5 339.742188 L 359.167969 339.742188 Z M 359.167969 324 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.607843%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 324 L 385.832031 324 L 385.832031 339.742188 L 372.5 339.742188 Z M 372.5 324 "/> +<path style="fill-rule:nonzero;fill:rgb(53.333333%,0%,17.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 355.480469 L 332.5 355.480469 L 332.5 371.222656 L 319.167969 371.222656 Z M 319.167969 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(86.666667%,23.137255%,14.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 355.480469 L 345.832031 355.480469 L 345.832031 371.222656 L 332.5 371.222656 Z M 332.5 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,58.039216%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 355.480469 L 359.164062 355.480469 L 359.164062 371.222656 L 345.832031 371.222656 Z M 345.832031 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,82.745098%,65.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 355.480469 L 372.5 355.480469 L 372.5 371.222656 L 359.167969 371.222656 Z M 359.167969 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(99.215686%,96.078431%,92.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 355.480469 L 385.832031 355.480469 L 385.832031 371.222656 L 372.5 371.222656 Z M 372.5 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(50.196078%,16.470588%,2.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 386.964844 L 332.5 386.964844 L 332.5 402.707031 L 319.167969 402.707031 Z M 319.167969 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,31.372549%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 386.964844 L 345.832031 386.964844 L 345.832031 402.707031 L 332.5 402.707031 Z M 332.5 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(96.862745%,57.254902%,11.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 386.964844 L 359.164062 386.964844 L 359.164062 402.707031 L 345.832031 402.707031 Z M 345.832031 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,80.392157%,63.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 386.964844 L 372.5 386.964844 L 372.5 402.707031 L 359.167969 402.707031 Z M 359.167969 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,96.078431%,92.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 386.964844 L 385.832031 386.964844 L 385.832031 402.707031 L 372.5 402.707031 Z M 372.5 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,27.058824%,20%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 418.445312 L 332.5 418.445312 L 332.5 434.1875 L 319.167969 434.1875 Z M 319.167969 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(15.294118%,55.686275%,34.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 418.445312 L 345.832031 418.445312 L 345.832031 434.1875 L 332.5 434.1875 Z M 332.5 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(52.156863%,78.431373%,46.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 418.445312 L 359.164062 418.445312 L 359.164062 434.1875 L 345.832031 434.1875 Z M 345.832031 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(84.705882%,92.941176%,71.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 418.445312 L 372.5 418.445312 L 372.5 434.1875 L 359.167969 434.1875 Z M 359.167969 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.607843%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 418.445312 L 385.832031 418.445312 L 385.832031 434.1875 L 372.5 434.1875 Z M 372.5 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(14.901961%,9.411765%,37.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 449.925781 L 332.5 449.925781 L 332.5 465.667969 L 319.167969 465.667969 Z M 319.167969 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,49.411765%,70.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 449.925781 L 345.832031 449.925781 L 345.832031 465.667969 L 332.5 465.667969 Z M 332.5 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(9.411765%,74.117647%,69.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 449.925781 L 359.164062 449.925781 L 359.164062 465.667969 L 345.832031 465.667969 Z M 345.832031 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(73.72549%,91.372549%,77.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 449.925781 L 372.5 449.925781 L 372.5 465.667969 L 359.167969 465.667969 Z M 359.167969 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,100%,86.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 449.925781 L 385.832031 449.925781 L 385.832031 465.667969 L 372.5 465.667969 Z M 372.5 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(42.745098%,0%,14.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 481.40625 L 332.5 481.40625 L 332.5 497.148438 L 319.167969 497.148438 Z M 319.167969 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(80%,10.196078%,21.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 481.40625 L 345.832031 481.40625 L 345.832031 497.148438 L 332.5 497.148438 Z M 332.5 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,45.882353%,37.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 481.40625 L 359.164062 481.40625 L 359.164062 497.148438 L 345.832031 497.148438 Z M 345.832031 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,75.686275%,67.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 481.40625 L 372.5 481.40625 L 372.5 497.148438 L 359.167969 497.148438 Z M 359.167969 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,96.078431%,94.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 481.40625 L 385.832031 481.40625 L 385.832031 497.148438 L 372.5 497.148438 Z M 372.5 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(28.627451%,0%,38.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 512.890625 L 332.5 512.890625 L 332.5 528.632812 L 319.167969 528.632812 Z M 319.167969 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(66.666667%,10.980392%,59.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 512.890625 L 345.832031 512.890625 L 345.832031 528.632812 L 332.5 528.632812 Z M 332.5 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,43.921569%,66.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 512.890625 L 359.164062 512.890625 L 359.164062 528.632812 L 345.832031 528.632812 Z M 345.832031 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,75.294118%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 512.890625 L 372.5 512.890625 L 372.5 528.632812 L 359.167969 528.632812 Z M 359.167969 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,96.078431%,94.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 512.890625 L 385.832031 512.890625 L 385.832031 528.632812 L 372.5 528.632812 Z M 372.5 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(38.039216%,7.45098%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 544.371094 L 332.5 544.371094 L 332.5 560.113281 L 319.167969 560.113281 Z M 319.167969 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(83.529412%,0%,41.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 544.371094 L 345.832031 544.371094 L 345.832031 560.113281 L 332.5 560.113281 Z M 332.5 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,41.568627%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 544.371094 L 359.164062 544.371094 L 359.164062 560.113281 L 345.832031 560.113281 Z M 345.832031 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(84.313725%,74.901961%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 544.371094 L 372.5 544.371094 L 372.5 560.113281 L 359.167969 560.113281 Z M 359.167969 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,98.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 544.371094 L 385.832031 544.371094 L 385.832031 560.113281 L 372.5 560.113281 Z M 372.5 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(23.921569%,9.019608%,47.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 575.851562 L 332.5 575.851562 L 332.5 591.59375 L 319.167969 591.59375 Z M 319.167969 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(44.313725%,36.470588%,66.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 575.851562 L 345.832031 575.851562 L 345.832031 591.59375 L 332.5 591.59375 Z M 332.5 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(65.098039%,61.568627%,80%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 575.851562 L 359.164062 575.851562 L 359.164062 591.59375 L 345.832031 591.59375 Z M 345.832031 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(84.705882%,83.137255%,92.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 575.851562 L 372.5 575.851562 L 372.5 591.59375 L 359.167969 591.59375 Z M 359.167969 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,98.431373%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 575.851562 L 385.832031 575.851562 L 385.832031 591.59375 L 372.5 591.59375 Z M 372.5 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="419.882812" y="68.123047"/> + <use xlink:href="#glyph0-30" x="425.882812" y="68.123047"/> + <use xlink:href="#glyph0-29" x="430.882812" y="68.123047"/> + <use xlink:href="#glyph0-30" x="436.882812" y="68.123047"/> + <use xlink:href="#glyph0-25" x="441.882812" y="68.123047"/> + <use xlink:href="#glyph0-21" x="448.882812" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="419.882812" y="99.603516"/> + <use xlink:href="#glyph0-30" x="425.882812" y="99.603516"/> + <use xlink:href="#glyph0-29" x="430.882812" y="99.603516"/> + <use xlink:href="#glyph0-30" x="436.882812" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="419.882812" y="131.087891"/> + <use xlink:href="#glyph0-10" x="426.882812" y="131.087891"/> + <use xlink:href="#glyph0-5" x="429.882812" y="131.087891"/> + <use xlink:href="#glyph0-5" x="434.882812" y="131.087891"/> + <use xlink:href="#glyph0-21" x="439.882812" y="131.087891"/> + <use xlink:href="#glyph0-3" x="444.882812" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="162.568359"/> + <use xlink:href="#glyph0-30" x="425.882812" y="162.568359"/> + <use xlink:href="#glyph0-25" x="430.882812" y="162.568359"/> + <use xlink:href="#glyph0-21" x="437.882812" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="419.882812" y="194.048828"/> + <use xlink:href="#glyph0-21" x="426.882812" y="194.048828"/> + <use xlink:href="#glyph0-29" x="431.882812" y="194.048828"/> + <use xlink:href="#glyph0-30" x="437.882812" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="225.529297"/> + <use xlink:href="#glyph0-30" x="425.882812" y="225.529297"/> + <use xlink:href="#glyph0-1" x="430.882812" y="225.529297"/> + <use xlink:href="#glyph0-30" x="436.882812" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="257.013672"/> + <use xlink:href="#glyph0-6" x="425.882812" y="257.013672"/> + <use xlink:href="#glyph0-30" x="427.882812" y="257.013672"/> + <use xlink:href="#glyph0-5" x="432.882812" y="257.013672"/> + <use xlink:href="#glyph0-3" x="437.882812" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-26" x="419.882812" y="288.494141"/> + <use xlink:href="#glyph0-2" x="424.882812" y="288.494141"/> + <use xlink:href="#glyph0-44" x="429.882812" y="288.494141"/> + <use xlink:href="#glyph0-18" x="431.882812" y="288.494141"/> + <use xlink:href="#glyph0-6" x="436.882812" y="288.494141"/> + <use xlink:href="#glyph0-6" x="438.882812" y="288.494141"/> + <use xlink:href="#glyph0-2" x="440.882812" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="419.882812" y="319.974609"/> + <use xlink:href="#glyph0-30" x="423.882812" y="319.974609"/> + <use xlink:href="#glyph0-10" x="428.882812" y="319.974609"/> + <use xlink:href="#glyph0-11" x="431.882812" y="319.974609"/> + <use xlink:href="#glyph0-30" x="435.882812" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-20" x="419.882812" y="351.455078"/> + <use xlink:href="#glyph0-2" x="425.882812" y="351.455078"/> + <use xlink:href="#glyph0-36" x="430.882812" y="351.455078"/> + <use xlink:href="#glyph0-2" x="436.882812" y="351.455078"/> + <use xlink:href="#glyph0-22" x="441.882812" y="351.455078"/> + <use xlink:href="#glyph0-22" x="443.882812" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="382.939453"/> + <use xlink:href="#glyph0-2" x="425.882812" y="382.939453"/> + <use xlink:href="#glyph0-4" x="430.882812" y="382.939453"/> + <use xlink:href="#glyph0-6" x="432.882812" y="382.939453"/> + <use xlink:href="#glyph0-18" x="434.882812" y="382.939453"/> + <use xlink:href="#glyph0-36" x="439.882812" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="414.419922"/> + <use xlink:href="#glyph0-6" x="425.882812" y="414.419922"/> + <use xlink:href="#glyph0-30" x="427.882812" y="414.419922"/> + <use xlink:href="#glyph0-5" x="432.882812" y="414.419922"/> + <use xlink:href="#glyph0-34" x="437.882812" y="414.419922"/> + <use xlink:href="#glyph0-32" x="440.882812" y="414.419922"/> + <use xlink:href="#glyph0-5" x="446.882812" y="414.419922"/> + <use xlink:href="#glyph0-19" x="451.882812" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="445.900391"/> + <use xlink:href="#glyph0-6" x="425.882812" y="445.900391"/> + <use xlink:href="#glyph0-30" x="427.882812" y="445.900391"/> + <use xlink:href="#glyph0-5" x="432.882812" y="445.900391"/> + <use xlink:href="#glyph0-34" x="437.882812" y="445.900391"/> + <use xlink:href="#glyph0-32" x="440.882812" y="445.900391"/> + <use xlink:href="#glyph0-5" x="446.882812" y="445.900391"/> + <use xlink:href="#glyph0-19" x="451.882812" y="445.900391"/> + <use xlink:href="#glyph0-7" x="456.882812" y="445.900391"/> + <use xlink:href="#glyph0-12" x="458.882812" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="477.380859"/> + <use xlink:href="#glyph0-6" x="425.882812" y="477.380859"/> + <use xlink:href="#glyph0-30" x="427.882812" y="477.380859"/> + <use xlink:href="#glyph0-5" x="432.882812" y="477.380859"/> + <use xlink:href="#glyph0-34" x="437.882812" y="477.380859"/> + <use xlink:href="#glyph0-32" x="440.882812" y="477.380859"/> + <use xlink:href="#glyph0-5" x="446.882812" y="477.380859"/> + <use xlink:href="#glyph0-19" x="451.882812" y="477.380859"/> + <use xlink:href="#glyph0-7" x="456.882812" y="477.380859"/> + <use xlink:href="#glyph0-13" x="458.882812" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="419.882812" y="508.865234"/> + <use xlink:href="#glyph0-5" x="425.882812" y="508.865234"/> + <use xlink:href="#glyph0-19" x="430.882812" y="508.865234"/> + <use xlink:href="#glyph0-34" x="435.882812" y="508.865234"/> + <use xlink:href="#glyph0-25" x="438.882812" y="508.865234"/> + <use xlink:href="#glyph0-10" x="445.882812" y="508.865234"/> + <use xlink:href="#glyph0-5" x="448.882812" y="508.865234"/> + <use xlink:href="#glyph0-5" x="453.882812" y="508.865234"/> + <use xlink:href="#glyph0-21" x="458.882812" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="419.882812" y="540.345703"/> + <use xlink:href="#glyph0-30" x="425.882812" y="540.345703"/> + <use xlink:href="#glyph0-10" x="430.882812" y="540.345703"/> + <use xlink:href="#glyph0-31" x="433.882812" y="540.345703"/> + <use xlink:href="#glyph0-6" x="438.882812" y="540.345703"/> + <use xlink:href="#glyph0-5" x="440.882812" y="540.345703"/> + <use xlink:href="#glyph0-34" x="445.882812" y="540.345703"/> + <use xlink:href="#glyph0-25" x="448.882812" y="540.345703"/> + <use xlink:href="#glyph0-10" x="455.882812" y="540.345703"/> + <use xlink:href="#glyph0-5" x="458.882812" y="540.345703"/> + <use xlink:href="#glyph0-5" x="463.882812" y="540.345703"/> + <use xlink:href="#glyph0-21" x="468.882812" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="419.882812" y="571.826172"/> + <use xlink:href="#glyph0-30" x="425.882812" y="571.826172"/> + <use xlink:href="#glyph0-10" x="430.882812" y="571.826172"/> + <use xlink:href="#glyph0-31" x="433.882812" y="571.826172"/> + <use xlink:href="#glyph0-6" x="438.882812" y="571.826172"/> + <use xlink:href="#glyph0-5" x="440.882812" y="571.826172"/> + <use xlink:href="#glyph0-34" x="445.882812" y="571.826172"/> + <use xlink:href="#glyph0-29" x="448.882812" y="571.826172"/> + <use xlink:href="#glyph0-10" x="454.882812" y="571.826172"/> + <use xlink:href="#glyph0-18" x="457.882812" y="571.826172"/> + <use xlink:href="#glyph0-36" x="462.882812" y="571.826172"/> + <use xlink:href="#glyph0-21" x="468.882812" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(0%,27.058824%,20%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 72.148438 L 433.214844 72.148438 L 433.214844 87.890625 L 419.882812 87.890625 Z M 419.882812 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,50.980392%,54.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 72.148438 L 446.546875 72.148438 L 446.546875 87.890625 L 433.214844 87.890625 Z M 433.214844 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(46.27451%,65.098039%,81.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 72.148438 L 459.878906 72.148438 L 459.878906 87.890625 L 446.546875 87.890625 Z M 446.546875 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(84.313725%,80.784314%,91.372549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 72.148438 L 473.214844 72.148438 L 473.214844 87.890625 L 459.882812 87.890625 Z M 459.882812 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,96.862745%,99.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 72.148438 L 486.546875 72.148438 L 486.546875 87.890625 L 473.214844 87.890625 Z M 473.214844 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(5.490196%,24.705882%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 103.628906 L 433.214844 103.628906 L 433.214844 119.371094 L 419.882812 119.371094 Z M 419.882812 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(6.666667%,45.098039%,69.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 103.628906 L 446.546875 103.628906 L 446.546875 119.371094 L 433.214844 119.371094 Z M 433.214844 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(53.72549%,63.529412%,80.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 103.628906 L 459.878906 103.628906 L 459.878906 119.371094 L 446.546875 119.371094 Z M 446.546875 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,82.352941%,90.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 103.628906 L 473.214844 103.628906 L 473.214844 119.371094 L 459.882812 119.371094 Z M 459.882812 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,97.647059%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 103.628906 L 486.546875 103.628906 L 486.546875 119.371094 L 473.214844 119.371094 Z M 473.214844 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,27.45098%,8.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 135.109375 L 433.214844 135.109375 L 433.214844 150.851562 L 419.882812 150.851562 Z M 419.882812 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(18.823529%,53.72549%,23.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 135.109375 L 446.546875 135.109375 L 446.546875 150.851562 L 433.214844 150.851562 Z M 433.214844 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(50.588235%,75.294118%,47.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 135.109375 L 459.878906 135.109375 L 459.878906 150.851562 L 446.546875 150.851562 Z M 446.546875 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(79.215686%,90.980392%,75.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 135.109375 L 473.214844 135.109375 L 473.214844 150.851562 L 459.882812 150.851562 Z M 459.882812 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,98.431373%,95.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 135.109375 L 486.546875 135.109375 L 486.546875 150.851562 L 473.214844 150.851562 Z M 473.214844 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(10.588235%,26.666667%,7.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 166.59375 L 433.214844 166.59375 L 433.214844 182.335938 L 419.882812 182.335938 Z M 419.882812 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,56.470588%,32.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 166.59375 L 446.546875 166.59375 L 446.546875 182.335938 L 433.214844 182.335938 Z M 433.214844 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(43.921569%,77.254902%,67.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 166.59375 L 459.878906 166.59375 L 459.878906 182.335938 L 446.546875 182.335938 Z M 446.546875 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(77.647059%,91.764706%,89.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 166.59375 L 473.214844 166.59375 L 473.214844 182.335938 L 459.882812 182.335938 Z M 459.882812 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,98.431373%,98.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 166.59375 L 486.546875 166.59375 L 486.546875 182.335938 L 473.214844 182.335938 Z M 473.214844 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(18.431373%,19.607843%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 198.074219 L 433.214844 198.074219 L 433.214844 213.816406 L 419.882812 213.816406 Z M 419.882812 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,56.470588%,72.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 198.074219 L 446.546875 198.074219 L 446.546875 213.816406 L 433.214844 213.816406 Z M 433.214844 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(32.941176%,79.215686%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 198.074219 L 459.878906 198.074219 L 459.878906 213.816406 L 446.546875 213.816406 Z M 446.546875 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,92.54902%,81.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 198.074219 L 473.214844 198.074219 L 473.214844 213.816406 L 459.882812 213.816406 Z M 459.882812 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,97.254902%,91.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 198.074219 L 486.546875 198.074219 L 486.546875 213.816406 L 473.214844 213.816406 Z M 473.214844 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(32.941176%,0%,27.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 229.554688 L 433.214844 229.554688 L 433.214844 245.296875 L 419.882812 245.296875 Z M 419.882812 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(51.372549%,27.45098%,63.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 229.554688 L 446.546875 229.554688 L 446.546875 245.296875 L 433.214844 245.296875 Z M 433.214844 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(56.470588%,60%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 229.554688 L 459.878906 229.554688 L 459.878906 245.296875 L 446.546875 245.296875 Z M 446.546875 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(74.509804%,83.921569%,90.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 229.554688 L 473.214844 229.554688 L 473.214844 245.296875 L 459.882812 245.296875 Z M 459.882812 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,98.431373%,98.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 229.554688 L 486.546875 229.554688 L 486.546875 245.296875 L 473.214844 245.296875 Z M 473.214844 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(15.294118%,21.960784%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 261.035156 L 433.214844 261.035156 L 433.214844 276.777344 L 419.882812 276.777344 Z M 419.882812 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(20.784314%,45.098039%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 261.035156 L 446.546875 261.035156 L 446.546875 276.777344 L 433.214844 276.777344 Z M 433.214844 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(49.803922%,67.058824%,82.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 261.035156 L 459.878906 261.035156 L 459.878906 276.777344 L 446.546875 276.777344 Z M 446.546875 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(75.686275%,85.882353%,92.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 261.035156 L 473.214844 261.035156 L 473.214844 276.777344 L 459.882812 276.777344 Z M 459.882812 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(95.686275%,98.039216%,99.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 261.035156 L 486.546875 261.035156 L 486.546875 276.777344 L 473.214844 276.777344 Z M 473.214844 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,100%,78.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 292.519531 L 433.214844 292.519531 L 433.214844 308.261719 L 419.882812 308.261719 Z M 419.882812 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(90.980392%,75.686275%,40.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 292.519531 L 446.546875 292.519531 L 446.546875 308.261719 L 433.214844 308.261719 Z M 433.214844 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,45.882353%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 292.519531 L 459.878906 292.519531 L 459.878906 308.261719 L 446.546875 308.261719 Z M 446.546875 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(56.862745%,21.176471%,25.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 292.519531 L 473.214844 292.519531 L 473.214844 308.261719 L 459.882812 308.261719 Z M 459.882812 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(11.372549%,4.313725%,7.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 292.519531 L 486.546875 292.519531 L 486.546875 308.261719 L 473.214844 308.261719 Z M 473.214844 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,91.372549%,91.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 324 L 433.214844 324 L 433.214844 339.742188 L 419.882812 339.742188 Z M 419.882812 324 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,67.843137%,53.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 324 L 446.546875 324 L 446.546875 339.742188 L 433.214844 339.742188 Z M 433.214844 324 "/> +<path style="fill-rule:nonzero;fill:rgb(57.254902%,50.980392%,38.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 324 L 459.878906 324 L 459.878906 339.742188 L 446.546875 339.742188 Z M 446.546875 324 "/> +<path style="fill-rule:nonzero;fill:rgb(29.411765%,29.803922%,25.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 324 L 473.214844 324 L 473.214844 339.742188 L 459.882812 339.742188 Z M 459.882812 324 "/> +<path style="fill-rule:nonzero;fill:rgb(1.568627%,1.568627%,1.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 324 L 486.546875 324 L 486.546875 339.742188 L 473.214844 339.742188 Z M 473.214844 324 "/> +<path style="fill-rule:nonzero;fill:rgb(54.509804%,0%,41.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 355.480469 L 433.214844 355.480469 L 433.214844 371.222656 L 419.882812 371.222656 Z M 419.882812 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,33.333333%,16.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 355.480469 L 446.546875 355.480469 L 446.546875 371.222656 L 433.214844 371.222656 Z M 433.214844 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(60.392157%,59.607843%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 355.480469 L 459.878906 355.480469 L 459.878906 371.222656 L 446.546875 371.222656 Z M 446.546875 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(36.470588%,82.352941%,56.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 355.480469 L 473.214844 355.480469 L 473.214844 371.222656 L 459.882812 371.222656 Z M 459.882812 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(69.019608%,95.686275%,98.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 355.480469 L 486.546875 355.480469 L 486.546875 371.222656 L 473.214844 371.222656 Z M 473.214844 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(12.54902%,6.666667%,34.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 386.964844 L 433.214844 386.964844 L 433.214844 402.707031 L 419.882812 402.707031 Z M 419.882812 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,36.862745%,36.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 386.964844 L 446.546875 386.964844 L 446.546875 402.707031 L 433.214844 402.707031 Z M 433.214844 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(34.117647%,54.509804%,12.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 386.964844 L 459.878906 386.964844 L 459.878906 402.707031 L 446.546875 402.707031 Z M 446.546875 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(90.980392%,61.960784%,41.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 386.964844 L 473.214844 386.964844 L 473.214844 402.707031 L 459.882812 402.707031 Z M 459.882812 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,80.784314%,95.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 386.964844 L 486.546875 386.964844 L 486.546875 402.707031 L 473.214844 402.707031 Z M 473.214844 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,24.705882%,64.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 418.445312 L 433.214844 418.445312 L 433.214844 434.1875 L 419.882812 434.1875 Z M 419.882812 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(63.137255%,65.098039%,78.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 418.445312 L 446.546875 418.445312 L 446.546875 434.1875 L 433.214844 434.1875 Z M 433.214844 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 418.445312 L 459.878906 418.445312 L 459.878906 434.1875 L 446.546875 434.1875 Z M 446.546875 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(79.215686%,61.176471%,64.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 418.445312 L 473.214844 418.445312 L 473.214844 434.1875 L 459.882812 434.1875 Z M 459.882812 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(55.686275%,2.352941%,23.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 418.445312 L 486.546875 418.445312 L 486.546875 434.1875 L 473.214844 434.1875 Z M 473.214844 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(29.019608%,43.529412%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 449.925781 L 433.214844 449.925781 L 433.214844 465.667969 L 419.882812 465.667969 Z M 419.882812 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(61.568627%,65.882353%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 449.925781 L 446.546875 449.925781 L 446.546875 465.667969 L 433.214844 465.667969 Z M 433.214844 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 449.925781 L 459.878906 449.925781 L 459.878906 465.667969 L 446.546875 465.667969 Z M 446.546875 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(89.411765%,58.431373%,64.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 449.925781 L 473.214844 449.925781 L 473.214844 465.667969 L 459.882812 465.667969 Z M 459.882812 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,24.705882%,41.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 449.925781 L 486.546875 449.925781 L 486.546875 465.667969 L 473.214844 465.667969 Z M 473.214844 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,18.431373%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 481.40625 L 433.214844 481.40625 L 433.214844 497.148438 L 419.882812 497.148438 Z M 419.882812 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(52.941176%,62.352941%,85.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 481.40625 L 446.546875 481.40625 L 446.546875 497.148438 L 433.214844 497.148438 Z M 433.214844 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 481.40625 L 459.878906 481.40625 L 459.878906 497.148438 L 446.546875 497.148438 Z M 446.546875 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,54.117647%,54.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 481.40625 L 473.214844 481.40625 L 473.214844 497.148438 L 459.882812 497.148438 Z M 459.882812 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(37.254902%,7.843137%,8.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 481.40625 L 486.546875 481.40625 L 486.546875 497.148438 L 473.214844 497.148438 Z M 473.214844 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(51.764706%,9.411765%,34.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 512.890625 L 433.214844 512.890625 L 433.214844 528.632812 L 419.882812 528.632812 Z M 419.882812 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,59.607843%,76.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 512.890625 L 446.546875 512.890625 L 446.546875 528.632812 L 433.214844 528.632812 Z M 433.214844 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 512.890625 L 459.878906 512.890625 L 459.878906 528.632812 L 446.546875 528.632812 Z M 446.546875 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(48.627451%,77.254902%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 512.890625 L 473.214844 512.890625 L 473.214844 528.632812 L 459.882812 528.632812 Z M 459.882812 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,33.72549%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 512.890625 L 486.546875 512.890625 L 486.546875 528.632812 L 473.214844 528.632812 Z M 473.214844 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(28.627451%,12.54902%,31.372549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 544.371094 L 433.214844 544.371094 L 433.214844 560.113281 L 419.882812 560.113281 Z M 419.882812 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(76.862745%,56.470588%,81.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 544.371094 L 446.546875 544.371094 L 446.546875 560.113281 L 433.214844 560.113281 Z M 433.214844 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 544.371094 L 459.878906 544.371094 L 459.878906 560.113281 L 446.546875 560.113281 Z M 446.546875 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(44.705882%,69.411765%,45.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 544.371094 L 473.214844 544.371094 L 473.214844 560.113281 L 459.882812 560.113281 Z M 459.882812 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,22.352941%,1.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 544.371094 L 486.546875 544.371094 L 486.546875 560.113281 L 473.214844 560.113281 Z M 473.214844 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(19.215686%,16.470588%,33.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 575.851562 L 433.214844 575.851562 L 433.214844 591.59375 L 419.882812 591.59375 Z M 419.882812 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(61.176471%,57.254902%,87.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 575.851562 L 446.546875 575.851562 L 446.546875 591.59375 L 433.214844 591.59375 Z M 433.214844 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 575.851562 L 459.878906 575.851562 L 459.878906 591.59375 L 446.546875 591.59375 Z M 446.546875 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(80.392157%,55.294118%,35.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 575.851562 L 473.214844 575.851562 L 473.214844 591.59375 L 459.882812 591.59375 Z M 459.882812 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(28.627451%,16.078431%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 575.851562 L 486.546875 575.851562 L 486.546875 591.59375 L 473.214844 591.59375 Z M 473.214844 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="520.59375" y="68.123047"/> + <use xlink:href="#glyph0-10" x="527.59375" y="68.123047"/> + <use xlink:href="#glyph0-5" x="530.59375" y="68.123047"/> + <use xlink:href="#glyph0-5" x="535.59375" y="68.123047"/> + <use xlink:href="#glyph0-21" x="540.59375" y="68.123047"/> + <use xlink:href="#glyph0-34" x="545.59375" y="68.123047"/> + <use xlink:href="#glyph0-29" x="548.59375" y="68.123047"/> + <use xlink:href="#glyph0-10" x="554.59375" y="68.123047"/> + <use xlink:href="#glyph0-18" x="557.59375" y="68.123047"/> + <use xlink:href="#glyph0-36" x="562.59375" y="68.123047"/> + <use xlink:href="#glyph0-21" x="568.59375" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="520.59375" y="99.603516"/> + <use xlink:href="#glyph0-6" x="526.59375" y="99.603516"/> + <use xlink:href="#glyph0-30" x="528.59375" y="99.603516"/> + <use xlink:href="#glyph0-5" x="533.59375" y="99.603516"/> + <use xlink:href="#glyph0-34" x="538.59375" y="99.603516"/> + <use xlink:href="#glyph0-35" x="540.59375" y="99.603516"/> + <use xlink:href="#glyph0-5" x="545.59375" y="99.603516"/> + <use xlink:href="#glyph0-6" x="550.59375" y="99.603516"/> + <use xlink:href="#glyph0-6" x="552.59375" y="99.603516"/> + <use xlink:href="#glyph0-18" x="554.59375" y="99.603516"/> + <use xlink:href="#glyph0-36" x="559.59375" y="99.603516"/> + <use xlink:href="#glyph0-7" x="565.59375" y="99.603516"/> + <use xlink:href="#glyph0-12" x="567.59375" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="520.59375" y="131.087891"/> + <use xlink:href="#glyph0-6" x="526.59375" y="131.087891"/> + <use xlink:href="#glyph0-30" x="528.59375" y="131.087891"/> + <use xlink:href="#glyph0-5" x="533.59375" y="131.087891"/> + <use xlink:href="#glyph0-34" x="538.59375" y="131.087891"/> + <use xlink:href="#glyph0-35" x="540.59375" y="131.087891"/> + <use xlink:href="#glyph0-5" x="545.59375" y="131.087891"/> + <use xlink:href="#glyph0-6" x="550.59375" y="131.087891"/> + <use xlink:href="#glyph0-6" x="552.59375" y="131.087891"/> + <use xlink:href="#glyph0-18" x="554.59375" y="131.087891"/> + <use xlink:href="#glyph0-36" x="559.59375" y="131.087891"/> + <use xlink:href="#glyph0-7" x="565.59375" y="131.087891"/> + <use xlink:href="#glyph0-13" x="567.59375" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="520.59375" y="162.568359"/> + <use xlink:href="#glyph0-10" x="527.59375" y="162.568359"/> + <use xlink:href="#glyph0-5" x="530.59375" y="162.568359"/> + <use xlink:href="#glyph0-5" x="535.59375" y="162.568359"/> + <use xlink:href="#glyph0-21" x="540.59375" y="162.568359"/> + <use xlink:href="#glyph0-34" x="545.59375" y="162.568359"/> + <use xlink:href="#glyph0-33" x="548.59375" y="162.568359"/> + <use xlink:href="#glyph0-10" x="555.59375" y="162.568359"/> + <use xlink:href="#glyph0-2" x="558.59375" y="162.568359"/> + <use xlink:href="#glyph0-21" x="563.59375" y="162.568359"/> + <use xlink:href="#glyph0-27" x="568.59375" y="162.568359"/> + <use xlink:href="#glyph0-5" x="573.59375" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-17" x="520.59375" y="194.048828"/> + <use xlink:href="#glyph0-24" x="526.59375" y="194.048828"/> + <use xlink:href="#glyph0-2" x="530.59375" y="194.048828"/> + <use xlink:href="#glyph0-21" x="535.59375" y="194.048828"/> + <use xlink:href="#glyph0-34" x="540.59375" y="194.048828"/> + <use xlink:href="#glyph0-41" x="543.59375" y="194.048828"/> + <use xlink:href="#glyph0-2" x="550.59375" y="194.048828"/> + <use xlink:href="#glyph0-27" x="555.59375" y="194.048828"/> + <use xlink:href="#glyph0-5" x="560.59375" y="194.048828"/> + <use xlink:href="#glyph0-21" x="565.59375" y="194.048828"/> + <use xlink:href="#glyph0-4" x="570.59375" y="194.048828"/> + <use xlink:href="#glyph0-2" x="572.59375" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="520.59375" y="225.529297"/> + <use xlink:href="#glyph0-10" x="524.59375" y="225.529297"/> + <use xlink:href="#glyph0-18" x="527.59375" y="225.529297"/> + <use xlink:href="#glyph0-31" x="532.59375" y="225.529297"/> + <use xlink:href="#glyph0-22" x="537.59375" y="225.529297"/> + <use xlink:href="#glyph0-23" x="539.59375" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="520.59375" y="257.013672"/> + <use xlink:href="#glyph0-10" x="526.59375" y="257.013672"/> + <use xlink:href="#glyph0-18" x="529.59375" y="257.013672"/> + <use xlink:href="#glyph0-23" x="534.59375" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-17" x="520.59375" y="288.494141"/> + <use xlink:href="#glyph0-18" x="526.59375" y="288.494141"/> + <use xlink:href="#glyph0-10" x="531.59375" y="288.494141"/> + <use xlink:href="#glyph0-11" x="534.59375" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-38" x="520.59375" y="319.974609"/> + <use xlink:href="#glyph0-22" x="526.59375" y="319.974609"/> + <use xlink:href="#glyph0-11" x="528.59375" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="520.59375" y="351.455078"/> + <use xlink:href="#glyph0-5" x="526.59375" y="351.455078"/> + <use xlink:href="#glyph0-10" x="531.59375" y="351.455078"/> + <use xlink:href="#glyph0-6" x="534.59375" y="351.455078"/> + <use xlink:href="#glyph0-22" x="536.59375" y="351.455078"/> + <use xlink:href="#glyph0-21" x="538.59375" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-26" x="520.59375" y="382.939453"/> + <use xlink:href="#glyph0-22" x="525.59375" y="382.939453"/> + <use xlink:href="#glyph0-3" x="527.59375" y="382.939453"/> + <use xlink:href="#glyph0-45" x="531.59375" y="382.939453"/> + <use xlink:href="#glyph0-18" x="536.59375" y="382.939453"/> + <use xlink:href="#glyph0-21" x="541.59375" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="520.59375" y="414.419922"/> + <use xlink:href="#glyph0-18" x="524.59375" y="414.419922"/> + <use xlink:href="#glyph0-46" x="529.59375" y="414.419922"/> + <use xlink:href="#glyph0-21" x="533.59375" y="414.419922"/> + <use xlink:href="#glyph0-18" x="538.59375" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-47" x="520.59375" y="445.900391"/> + <use xlink:href="#glyph0-10" x="526.59375" y="445.900391"/> + <use xlink:href="#glyph0-16" x="529.59375" y="445.900391"/> + <use xlink:href="#glyph0-24" x="536.59375" y="445.900391"/> + <use xlink:href="#glyph0-32" x="540.59375" y="445.900391"/> + <use xlink:href="#glyph0-18" x="546.59375" y="445.900391"/> + <use xlink:href="#glyph0-3" x="551.59375" y="445.900391"/> + <use xlink:href="#glyph0-5" x="555.59375" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-42" x="520.59375" y="477.380859"/> + <use xlink:href="#glyph0-2" x="526.59375" y="477.380859"/> + <use xlink:href="#glyph0-10" x="531.59375" y="477.380859"/> + <use xlink:href="#glyph0-4" x="534.59375" y="477.380859"/> + <use xlink:href="#glyph0-28" x="536.59375" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-48" x="520.59375" y="508.865234"/> + <use xlink:href="#glyph0-2" x="525.59375" y="508.865234"/> + <use xlink:href="#glyph0-6" x="530.59375" y="508.865234"/> + <use xlink:href="#glyph0-6" x="532.59375" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="520.59375" y="540.345703"/> + <use xlink:href="#glyph0-5" x="527.59375" y="540.345703"/> + <use xlink:href="#glyph0-24" x="531.59375" y="540.345703"/> + <use xlink:href="#glyph0-3" x="535.59375" y="540.345703"/> + <use xlink:href="#glyph0-5" x="539.59375" y="540.345703"/> + <use xlink:href="#glyph0-10" x="544.59375" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="520.59375" y="571.826172"/> + <use xlink:href="#glyph0-5" x="524.59375" y="571.826172"/> + <use xlink:href="#glyph0-2" x="529.59375" y="571.826172"/> + <use xlink:href="#glyph0-6" x="534.59375" y="571.826172"/> + <use xlink:href="#glyph0-32" x="536.59375" y="571.826172"/> + <use xlink:href="#glyph0-18" x="542.59375" y="571.826172"/> + <use xlink:href="#glyph0-3" x="547.59375" y="571.826172"/> + <use xlink:href="#glyph0-5" x="551.59375" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(0%,29.411765%,25.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 72.148438 L 533.925781 72.148438 L 533.925781 87.890625 L 520.59375 87.890625 Z M 520.59375 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(18.039216%,74.509804%,69.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 72.148438 L 547.261719 72.148438 L 547.261719 87.890625 L 533.929688 87.890625 Z M 533.929688 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 72.148438 L 560.59375 72.148438 L 560.59375 87.890625 L 547.261719 87.890625 Z M 547.261719 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,64.313725%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 72.148438 L 573.925781 72.148438 L 573.925781 87.890625 L 560.59375 87.890625 Z M 560.59375 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(32.54902%,21.176471%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 72.148438 L 587.261719 72.148438 L 587.261719 87.890625 L 573.929688 87.890625 Z M 573.929688 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(30.980392%,32.54902%,71.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 103.628906 L 533.925781 103.628906 L 533.925781 119.371094 L 520.59375 119.371094 Z M 520.59375 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(66.666667%,67.058824%,83.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 103.628906 L 547.261719 103.628906 L 547.261719 119.371094 L 533.929688 119.371094 Z M 533.929688 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 103.628906 L 560.59375 103.628906 L 560.59375 119.371094 L 547.261719 119.371094 Z M 547.261719 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(70.980392%,68.627451%,50.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 103.628906 L 573.925781 103.628906 L 573.925781 119.371094 L 560.59375 119.371094 Z M 560.59375 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(41.960784%,38.039216%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 103.628906 L 587.261719 103.628906 L 587.261719 119.371094 L 573.929688 119.371094 Z M 573.929688 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(62.352941%,63.529412%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 135.109375 L 533.925781 135.109375 L 533.925781 150.851562 L 520.59375 150.851562 Z M 520.59375 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(84.313725%,85.098039%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 135.109375 L 547.261719 135.109375 L 547.261719 150.851562 L 533.929688 150.851562 Z M 533.929688 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 135.109375 L 560.59375 135.109375 L 560.59375 150.851562 L 547.261719 150.851562 Z M 547.261719 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,88.235294%,56.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 135.109375 L 573.925781 135.109375 L 573.925781 150.851562 L 560.59375 150.851562 Z M 560.59375 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(72.941176%,68.235294%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 135.109375 L 587.261719 135.109375 L 587.261719 150.851562 L 573.929688 150.851562 Z M 573.929688 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(6.666667%,77.647059%,21.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 166.59375 L 533.925781 166.59375 L 533.925781 182.335938 L 520.59375 182.335938 Z M 520.59375 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(58.431373%,83.921569%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 166.59375 L 547.261719 166.59375 L 547.261719 182.335938 L 533.929688 182.335938 Z M 533.929688 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 166.59375 L 560.59375 166.59375 L 560.59375 182.335938 L 547.261719 182.335938 Z M 547.261719 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(94.117647%,73.72549%,58.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 166.59375 L 573.925781 166.59375 L 573.925781 182.335938 L 560.59375 182.335938 Z M 560.59375 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,59.215686%,3.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 166.59375 L 587.261719 166.59375 L 587.261719 182.335938 L 573.929688 182.335938 Z M 573.929688 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(5.882353%,81.176471%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 198.074219 L 533.925781 198.074219 L 533.925781 213.816406 L 520.59375 213.816406 Z M 520.59375 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(73.72549%,89.803922%,87.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 198.074219 L 547.261719 198.074219 L 547.261719 213.816406 L 533.929688 213.816406 Z M 533.929688 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 198.074219 L 560.59375 198.074219 L 560.59375 213.816406 L 547.261719 213.816406 Z M 547.261719 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,82.745098%,90.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 198.074219 L 573.925781 198.074219 L 573.925781 213.816406 L 560.59375 213.816406 Z M 560.59375 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(96.862745%,61.176471%,83.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 198.074219 L 587.261719 198.074219 L 587.261719 213.816406 L 573.929688 213.816406 Z M 573.929688 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,60.784314%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 229.554688 L 533.925781 229.554688 L 533.925781 245.296875 L 520.59375 245.296875 Z M 520.59375 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,77.254902%,78.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 229.554688 L 547.261719 229.554688 L 547.261719 245.296875 L 533.929688 245.296875 Z M 533.929688 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 229.554688 L 560.59375 229.554688 L 560.59375 245.296875 L 547.261719 245.296875 Z M 547.261719 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(87.058824%,66.27451%,80%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 229.554688 L 573.925781 229.554688 L 573.925781 245.296875 L 560.59375 245.296875 Z M 560.59375 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,36.470588%,66.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 229.554688 L 587.261719 229.554688 L 587.261719 245.296875 L 573.929688 245.296875 Z M 573.929688 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,16.862745%,29.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 261.035156 L 533.925781 261.035156 L 533.925781 276.777344 L 520.59375 276.777344 Z M 520.59375 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(39.215686%,51.372549%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 261.035156 L 547.261719 261.035156 L 547.261719 276.777344 L 533.929688 276.777344 Z M 533.929688 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 261.035156 L 560.59375 261.035156 L 560.59375 276.777344 L 547.261719 276.777344 Z M 547.261719 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(51.372549%,50.980392%,32.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 261.035156 L 573.925781 261.035156 L 573.925781 276.777344 L 560.59375 276.777344 Z M 560.59375 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(16.078431%,15.686275%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 261.035156 L 587.261719 261.035156 L 587.261719 276.777344 L 573.929688 276.777344 Z M 573.929688 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,16.078431%,30.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 292.519531 L 533.925781 292.519531 L 533.925781 308.261719 L 520.59375 308.261719 Z M 520.59375 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(41.568627%,55.294118%,71.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 292.519531 L 547.261719 292.519531 L 547.261719 308.261719 L 533.929688 308.261719 Z M 533.929688 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 292.519531 L 560.59375 292.519531 L 560.59375 308.261719 L 547.261719 308.261719 Z M 547.261719 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(39.607843%,59.215686%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 292.519531 L 573.925781 292.519531 L 573.925781 308.261719 L 560.59375 308.261719 Z M 560.59375 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,18.431373%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 292.519531 L 587.261719 292.519531 L 587.261719 308.261719 L 573.929688 308.261719 Z M 573.929688 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,18.039216%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 324 L 533.925781 324 L 533.925781 339.742188 L 520.59375 339.742188 Z M 520.59375 324 "/> +<path style="fill-rule:nonzero;fill:rgb(35.294118%,56.470588%,73.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 324 L 547.261719 324 L 547.261719 339.742188 L 533.929688 339.742188 Z M 533.929688 324 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 324 L 560.59375 324 L 560.59375 339.742188 L 547.261719 339.742188 Z M 547.261719 324 "/> +<path style="fill-rule:nonzero;fill:rgb(66.27451%,52.156863%,30.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 324 L 573.925781 324 L 573.925781 339.742188 L 560.59375 339.742188 Z M 560.59375 324 "/> +<path style="fill-rule:nonzero;fill:rgb(24.313725%,12.54902%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 324 L 587.261719 324 L 587.261719 339.742188 L 573.929688 339.742188 Z M 573.929688 324 "/> +<path style="fill-rule:nonzero;fill:rgb(49.803922%,74.901961%,96.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 355.480469 L 533.925781 355.480469 L 533.925781 371.222656 L 520.59375 371.222656 Z M 520.59375 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,29.411765%,45.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 355.480469 L 547.261719 355.480469 L 547.261719 371.222656 L 533.929688 371.222656 Z M 533.929688 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(6.666667%,6.666667%,6.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 355.480469 L 560.59375 355.480469 L 560.59375 371.222656 L 547.261719 371.222656 Z M 547.261719 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(44.313725%,20.392157%,18.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 355.480469 L 573.925781 355.480469 L 573.925781 371.222656 L 560.59375 371.222656 Z M 560.59375 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,63.529412%,61.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 355.480469 L 587.261719 355.480469 L 587.261719 371.222656 L 573.929688 371.222656 Z M 573.929688 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,98.823529%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 386.964844 L 533.925781 386.964844 L 533.925781 402.707031 L 520.59375 402.707031 Z M 520.59375 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(39.607843%,50.980392%,61.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 386.964844 L 547.261719 386.964844 L 547.261719 402.707031 L 533.929688 402.707031 Z M 533.929688 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(9.411765%,9.411765%,9.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 386.964844 L 560.59375 386.964844 L 560.59375 402.707031 L 547.261719 402.707031 Z M 547.261719 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(50.980392%,50.588235%,33.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 386.964844 L 573.925781 386.964844 L 573.925781 402.707031 L 560.59375 402.707031 Z M 560.59375 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,98.823529%,82.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 386.964844 L 587.261719 386.964844 L 587.261719 402.707031 L 573.929688 402.707031 Z M 573.929688 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,87.843137%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 418.445312 L 533.925781 418.445312 L 533.925781 434.1875 L 520.59375 434.1875 Z M 520.59375 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(40%,43.137255%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 418.445312 L 547.261719 418.445312 L 547.261719 434.1875 L 533.929688 434.1875 Z M 533.929688 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(6.666667%,6.666667%,6.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 418.445312 L 560.59375 418.445312 L 560.59375 434.1875 L 547.261719 434.1875 Z M 547.261719 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(33.333333%,47.843137%,27.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 418.445312 L 573.925781 418.445312 L 573.925781 434.1875 L 560.59375 434.1875 Z M 560.59375 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(76.078431%,93.72549%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 418.445312 L 587.261719 418.445312 L 587.261719 434.1875 L 573.929688 434.1875 Z M 573.929688 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,41.176471%,50.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 449.925781 L 533.925781 449.925781 L 533.925781 465.667969 L 520.59375 465.667969 Z M 520.59375 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(89.803922%,66.27451%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 449.925781 L 547.261719 449.925781 L 547.261719 465.667969 L 533.929688 465.667969 Z M 533.929688 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,98.823529%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 449.925781 L 560.59375 449.925781 L 560.59375 465.667969 L 547.261719 465.667969 Z M 547.261719 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(70.980392%,74.509804%,49.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 449.925781 L 573.925781 449.925781 L 573.925781 465.667969 L 560.59375 465.667969 Z M 560.59375 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(47.45098%,50.980392%,20%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 449.925781 L 587.261719 449.925781 L 587.261719 465.667969 L 573.929688 465.667969 Z M 573.929688 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(63.921569%,41.960784%,16.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 481.40625 L 533.925781 481.40625 L 533.925781 497.148438 L 520.59375 497.148438 Z M 520.59375 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(77.647059%,66.666667%,45.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 481.40625 L 547.261719 481.40625 L 547.261719 497.148438 L 533.929688 497.148438 Z M 533.929688 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,91.764706%,76.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 481.40625 L 560.59375 481.40625 L 560.59375 497.148438 L 547.261719 497.148438 Z M 547.261719 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(58.039216%,72.54902%,65.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 481.40625 L 573.925781 481.40625 L 573.925781 497.148438 L 560.59375 497.148438 Z M 560.59375 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(14.901961%,52.54902%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 481.40625 L 587.261719 481.40625 L 587.261719 497.148438 L 573.929688 497.148438 Z M 573.929688 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(23.529412%,34.901961%,25.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 512.890625 L 533.925781 512.890625 L 533.925781 528.632812 L 520.59375 528.632812 Z M 520.59375 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(58.039216%,63.921569%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 512.890625 L 547.261719 512.890625 L 547.261719 528.632812 L 533.929688 528.632812 Z M 533.929688 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(98.431373%,94.901961%,76.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 512.890625 L 560.59375 512.890625 L 560.59375 528.632812 L 547.261719 528.632812 Z M 547.261719 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,65.882353%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 512.890625 L 573.925781 512.890625 L 573.925781 528.632812 L 560.59375 528.632812 Z M 560.59375 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,32.156863%,16.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 512.890625 L 587.261719 512.890625 L 587.261719 528.632812 L 573.929688 528.632812 Z M 573.929688 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,52.156863%,52.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 544.371094 L 533.925781 544.371094 L 533.925781 560.113281 L 520.59375 560.113281 Z M 520.59375 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(60.784314%,72.941176%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 544.371094 L 547.261719 544.371094 L 547.261719 560.113281 L 533.929688 560.113281 Z M 533.929688 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(98.431373%,94.901961%,76.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 544.371094 L 560.59375 544.371094 L 560.59375 560.113281 L 547.261719 560.113281 Z M 547.261719 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(87.058824%,65.882353%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 544.371094 L 573.925781 544.371094 L 573.925781 560.113281 L 560.59375 560.113281 Z M 560.59375 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,32.156863%,16.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 544.371094 L 587.261719 544.371094 L 587.261719 560.113281 L 573.929688 560.113281 Z M 573.929688 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,58.431373%,57.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 575.851562 L 533.925781 575.851562 L 533.925781 591.59375 L 520.59375 591.59375 Z M 520.59375 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(62.352941%,73.72549%,64.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 575.851562 L 547.261719 575.851562 L 547.261719 591.59375 L 533.929688 591.59375 Z M 533.929688 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,91.372549%,78.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 575.851562 L 560.59375 575.851562 L 560.59375 591.59375 L 547.261719 591.59375 Z M 547.261719 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(85.098039%,67.058824%,56.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 575.851562 L 573.925781 575.851562 L 573.925781 591.59375 L 560.59375 591.59375 Z M 560.59375 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,36.078431%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 575.851562 L 587.261719 575.851562 L 587.261719 591.59375 L 573.929688 591.59375 Z M 573.929688 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="621.308594" y="194.048828"/> + <use xlink:href="#glyph0-5" x="625.308594" y="194.048828"/> + <use xlink:href="#glyph0-16" x="630.308594" y="194.048828"/> + <use xlink:href="#glyph0-31" x="637.308594" y="194.048828"/> + <use xlink:href="#glyph0-3" x="642.308594" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="621.308594" y="225.529297"/> + <use xlink:href="#glyph0-30" x="627.308594" y="225.529297"/> + <use xlink:href="#glyph0-33" x="632.308594" y="225.529297"/> + <use xlink:href="#glyph0-10" x="639.308594" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="257.013672"/> + <use xlink:href="#glyph0-19" x="627.308594" y="257.013672"/> + <use xlink:href="#glyph0-29" x="632.308594" y="257.013672"/> + <use xlink:href="#glyph0-30" x="638.308594" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="288.494141"/> + <use xlink:href="#glyph0-19" x="627.308594" y="288.494141"/> + <use xlink:href="#glyph0-25" x="632.308594" y="288.494141"/> + <use xlink:href="#glyph0-24" x="638.308594" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="621.308594" y="319.974609"/> + <use xlink:href="#glyph0-22" x="626.308594" y="319.974609"/> + <use xlink:href="#glyph0-35" x="628.308594" y="319.974609"/> + <use xlink:href="#glyph0-25" x="633.308594" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="621.308594" y="351.455078"/> + <use xlink:href="#glyph0-32" x="626.308594" y="351.455078"/> + <use xlink:href="#glyph0-25" x="632.308594" y="351.455078"/> + <use xlink:href="#glyph0-21" x="639.308594" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="621.308594" y="382.939453"/> + <use xlink:href="#glyph0-10" x="627.308594" y="382.939453"/> + <use xlink:href="#glyph0-29" x="630.308594" y="382.939453"/> + <use xlink:href="#glyph0-25" x="636.308594" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="414.419922"/> + <use xlink:href="#glyph0-19" x="627.308594" y="414.419922"/> + <use xlink:href="#glyph0-35" x="632.308594" y="414.419922"/> + <use xlink:href="#glyph0-6" x="638.308594" y="414.419922"/> + <use xlink:href="#glyph0-29" x="640.308594" y="414.419922"/> + <use xlink:href="#glyph0-30" x="646.308594" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="445.900391"/> + <use xlink:href="#glyph0-19" x="627.308594" y="445.900391"/> + <use xlink:href="#glyph0-35" x="632.308594" y="445.900391"/> + <use xlink:href="#glyph0-6" x="638.308594" y="445.900391"/> + <use xlink:href="#glyph0-25" x="640.308594" y="445.900391"/> + <use xlink:href="#glyph0-21" x="647.308594" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="621.308594" y="477.380859"/> + <use xlink:href="#glyph0-31" x="627.308594" y="477.380859"/> + <use xlink:href="#glyph0-5" x="632.308594" y="477.380859"/> + <use xlink:href="#glyph0-23" x="637.308594" y="477.380859"/> + <use xlink:href="#glyph0-4" x="641.308594" y="477.380859"/> + <use xlink:href="#glyph0-10" x="643.308594" y="477.380859"/> + <use xlink:href="#glyph0-2" x="646.308594" y="477.380859"/> + <use xlink:href="#glyph0-6" x="651.308594" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-49" x="621.308594" y="508.865234"/> + <use xlink:href="#glyph0-22" x="626.308594" y="508.865234"/> + <use xlink:href="#glyph0-3" x="628.308594" y="508.865234"/> + <use xlink:href="#glyph0-3" x="632.308594" y="508.865234"/> + <use xlink:href="#glyph0-18" x="636.308594" y="508.865234"/> + <use xlink:href="#glyph0-30" x="641.308594" y="508.865234"/> + <use xlink:href="#glyph0-7" x="646.308594" y="508.865234"/> + <use xlink:href="#glyph0-8" x="648.308594" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-17" x="621.308594" y="540.345703"/> + <use xlink:href="#glyph0-22" x="627.308594" y="540.345703"/> + <use xlink:href="#glyph0-50" x="629.308594" y="540.345703"/> + <use xlink:href="#glyph0-22" x="633.308594" y="540.345703"/> + <use xlink:href="#glyph0-19" x="635.308594" y="540.345703"/> + <use xlink:href="#glyph0-22" x="640.308594" y="540.345703"/> + <use xlink:href="#glyph0-3" x="642.308594" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="571.826172"/> + <use xlink:href="#glyph0-18" x="627.308594" y="571.826172"/> + <use xlink:href="#glyph0-16" x="632.308594" y="571.826172"/> + <use xlink:href="#glyph0-2" x="639.308594" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(3.137255%,57.647059%,57.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 198.074219 L 634.640625 198.074219 L 634.640625 213.816406 L 621.308594 213.816406 Z M 621.308594 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(42.352941%,76.470588%,50.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 198.074219 L 647.976562 198.074219 L 647.976562 213.816406 L 634.644531 213.816406 Z M 634.644531 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,88.627451%,61.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 198.074219 L 661.308594 198.074219 L 661.308594 213.816406 L 647.976562 213.816406 Z M 647.976562 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,62.352941%,41.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 198.074219 L 674.640625 198.074219 L 674.640625 213.816406 L 661.308594 213.816406 Z M 661.308594 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(81.176471%,34.901961%,49.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 198.074219 L 687.976562 198.074219 L 687.976562 213.816406 L 674.644531 213.816406 Z M 674.644531 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(45.490196%,21.568627%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 229.554688 L 634.640625 229.554688 L 634.640625 245.296875 L 621.308594 245.296875 Z M 621.308594 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,61.960784%,31.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 229.554688 L 647.976562 229.554688 L 647.976562 245.296875 L 634.644531 245.296875 Z M 634.644531 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 229.554688 L 661.308594 229.554688 L 661.308594 245.296875 L 647.976562 245.296875 Z M 647.976562 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(59.215686%,57.254902%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 229.554688 L 674.640625 229.554688 L 674.640625 245.296875 L 661.308594 245.296875 Z M 661.308594 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(10.980392%,5.098039%,31.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 229.554688 L 687.976562 229.554688 L 687.976562 245.296875 L 674.644531 245.296875 Z M 674.644531 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(38.039216%,7.45098%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 261.035156 L 634.640625 261.035156 L 634.640625 276.777344 L 621.308594 276.777344 Z M 621.308594 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(87.45098%,50.980392%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 261.035156 L 647.976562 261.035156 L 647.976562 276.777344 L 634.644531 276.777344 Z M 634.644531 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 261.035156 L 661.308594 261.035156 L 661.308594 276.777344 L 647.976562 276.777344 Z M 647.976562 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(43.529412%,68.627451%,81.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 261.035156 L 674.640625 261.035156 L 674.640625 276.777344 L 661.308594 276.777344 Z M 661.308594 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,20.784314%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 261.035156 L 687.976562 261.035156 L 687.976562 276.777344 L 674.644531 276.777344 Z M 674.644531 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(40.784314%,0%,11.372549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 292.519531 L 634.640625 292.519531 L 634.640625 308.261719 L 621.308594 308.261719 Z M 621.308594 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,50.980392%,34.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 292.519531 L 647.976562 292.519531 L 647.976562 308.261719 L 634.644531 308.261719 Z M 634.644531 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 292.519531 L 661.308594 292.519531 L 661.308594 308.261719 L 647.976562 308.261719 Z M 647.976562 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(60.784314%,60.784314%,60.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 292.519531 L 674.640625 292.519531 L 674.640625 308.261719 L 661.308594 308.261719 Z M 661.308594 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(18.823529%,18.823529%,18.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 292.519531 L 687.976562 292.519531 L 687.976562 308.261719 L 674.644531 308.261719 Z M 674.644531 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(56.470588%,0%,36.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 324 L 634.640625 324 L 634.640625 339.742188 L 621.308594 339.742188 Z M 621.308594 324 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,60%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 324 L 647.976562 324 L 647.976562 339.742188 L 634.644531 339.742188 Z M 634.644531 324 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 324 L 661.308594 324 L 661.308594 339.742188 L 647.976562 339.742188 Z M 647.976562 324 "/> +<path style="fill-rule:nonzero;fill:rgb(58.039216%,78.823529%,43.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 324 L 674.640625 324 L 674.640625 339.742188 L 661.308594 339.742188 Z M 661.308594 324 "/> +<path style="fill-rule:nonzero;fill:rgb(19.215686%,36.470588%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 324 L 687.976562 324 L 687.976562 339.742188 L 674.644531 339.742188 Z M 674.644531 324 "/> +<path style="fill-rule:nonzero;fill:rgb(25.490196%,5.490196%,28.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 355.480469 L 634.640625 355.480469 L 634.640625 371.222656 L 621.308594 371.222656 Z M 621.308594 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(69.019608%,52.156863%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 355.480469 L 647.976562 355.480469 L 647.976562 371.222656 L 634.644531 371.222656 Z M 634.644531 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 355.480469 L 661.308594 355.480469 L 661.308594 371.222656 L 647.976562 371.222656 Z M 647.976562 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(48.627451%,74.901961%,48.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 355.480469 L 674.640625 355.480469 L 674.640625 371.222656 L 661.308594 371.222656 Z M 661.308594 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(9.019608%,26.666667%,9.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 355.480469 L 687.976562 355.480469 L 687.976562 371.222656 L 674.644531 371.222656 Z M 674.644531 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(32.54902%,21.176471%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 386.964844 L 634.640625 386.964844 L 634.640625 402.707031 L 621.308594 402.707031 Z M 621.308594 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(81.960784%,63.921569%,34.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 386.964844 L 647.976562 386.964844 L 647.976562 402.707031 L 634.644531 402.707031 Z M 634.644531 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 386.964844 L 661.308594 386.964844 L 661.308594 402.707031 L 647.976562 402.707031 Z M 647.976562 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(40.392157%,69.803922%,66.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 386.964844 L 674.640625 386.964844 L 674.640625 402.707031 L 661.308594 402.707031 Z M 661.308594 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,23.921569%,20.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 386.964844 L 687.976562 386.964844 L 687.976562 402.707031 L 674.644531 402.707031 Z M 674.644531 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(64.705882%,6.666667%,13.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 418.445312 L 634.640625 418.445312 L 634.640625 434.1875 L 621.308594 434.1875 Z M 621.308594 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(92.156863%,61.176471%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 418.445312 L 647.976562 418.445312 L 647.976562 434.1875 L 634.644531 434.1875 Z M 634.644531 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.215686%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 418.445312 L 661.308594 418.445312 L 661.308594 434.1875 L 647.976562 434.1875 Z M 647.976562 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(41.176471%,73.333333%,67.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 418.445312 L 674.640625 418.445312 L 674.640625 434.1875 L 661.308594 434.1875 Z M 661.308594 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(19.607843%,30.196078%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 418.445312 L 687.976562 418.445312 L 687.976562 434.1875 L 674.644531 434.1875 Z M 674.644531 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(64.705882%,6.666667%,13.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 449.925781 L 634.640625 449.925781 L 634.640625 465.667969 L 621.308594 465.667969 Z M 621.308594 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(92.156863%,61.176471%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 449.925781 L 647.976562 449.925781 L 647.976562 465.667969 L 634.644531 465.667969 Z M 634.644531 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.215686%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 449.925781 L 661.308594 449.925781 L 661.308594 465.667969 L 647.976562 465.667969 Z M 647.976562 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(52.156863%,73.72549%,27.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 449.925781 L 674.640625 449.925781 L 674.640625 465.667969 L 661.308594 465.667969 Z M 661.308594 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,38.431373%,15.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 449.925781 L 687.976562 449.925781 L 687.976562 465.667969 L 674.644531 465.667969 Z M 674.644531 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,10.588235%,29.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 481.40625 L 634.640625 481.40625 L 634.640625 497.148438 L 621.308594 497.148438 Z M 621.308594 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,60.784314%,16.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 481.40625 L 647.976562 481.40625 L 647.976562 497.148438 L 634.644531 497.148438 Z M 634.644531 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.215686%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 481.40625 L 661.308594 481.40625 L 661.308594 497.148438 L 647.976562 497.148438 Z M 647.976562 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(13.333333%,76.862745%,70.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 481.40625 L 674.640625 481.40625 L 674.640625 497.148438 L 661.308594 497.148438 Z M 661.308594 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(34.509804%,29.411765%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 481.40625 L 687.976562 481.40625 L 687.976562 497.148438 L 674.644531 497.148438 Z M 674.644531 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(23.137255%,60%,69.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 512.890625 L 634.640625 512.890625 L 634.640625 528.632812 L 621.308594 528.632812 Z M 621.308594 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(48.627451%,72.941176%,58.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 512.890625 L 647.976562 512.890625 L 647.976562 528.632812 L 634.644531 528.632812 Z M 634.644531 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,79.607843%,16.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 512.890625 L 661.308594 512.890625 L 661.308594 528.632812 L 647.976562 528.632812 Z M 647.976562 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(90.588235%,56.078431%,3.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 512.890625 L 674.640625 512.890625 L 674.640625 528.632812 L 661.308594 528.632812 Z M 661.308594 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,9.803922%,10.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 512.890625 L 687.976562 512.890625 L 687.976562 528.632812 L 674.644531 528.632812 Z M 674.644531 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,12.941176%,30.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 544.371094 L 634.640625 544.371094 L 634.640625 560.113281 L 621.308594 560.113281 Z M 621.308594 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(24.313725%,29.803922%,43.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 544.371094 L 647.976562 544.371094 L 647.976562 560.113281 L 634.644531 560.113281 Z M 634.644531 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(48.627451%,48.627451%,48.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 544.371094 L 661.308594 544.371094 L 661.308594 560.113281 L 647.976562 560.113281 Z M 647.976562 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(74.901961%,69.411765%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 544.371094 L 674.640625 544.371094 L 674.640625 560.113281 L 661.308594 560.113281 Z M 661.308594 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,91.372549%,24.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 544.371094 L 687.976562 544.371094 L 687.976562 560.113281 L 674.644531 560.113281 Z M 674.644531 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,0.392157%,7.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 575.851562 L 634.640625 575.851562 L 634.640625 591.59375 L 621.308594 591.59375 Z M 621.308594 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(77.254902%,63.921569%,25.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 575.851562 L 647.976562 575.851562 L 647.976562 591.59375 L 634.644531 591.59375 Z M 634.644531 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,93.72549%,81.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 575.851562 L 661.308594 575.851562 L 661.308594 591.59375 L 647.976562 591.59375 Z M 647.976562 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,66.666667%,67.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 575.851562 L 674.640625 575.851562 L 674.640625 591.59375 L 661.308594 591.59375 Z M 661.308594 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(12.156863%,15.686275%,63.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 575.851562 L 687.976562 575.851562 L 687.976562 591.59375 L 674.644531 591.59375 Z M 674.644531 575.851562 "/> +</g> +</svg> \ No newline at end of file diff --git a/public/03-vector_data.html b/public/03-vector_data.html index 7d0efb159055a4e0ced8f3dcab1e745bb7766bbe..6984d4bfdb30da56c8c44ff1b38dc12e0d4e9535 100644 --- a/public/03-vector_data.html +++ b/public/03-vector_data.html @@ -88,7 +88,7 @@ code span.wa { color: #60a0b0; font-weight: bold; font-style: italic; } /* Warni <script src="site_libs/quarto-search/fuse.min.js"></script> <script src="site_libs/quarto-search/quarto-search.js"></script> <meta name="quarto:offset" content="./"> -<link href="./references.html" rel="next"> +<link href="./05-mapping_with_r.html" rel="next"> <link href="./02-data_acquisition.html" rel="prev"> <script src="site_libs/quarto-html/quarto.js"></script> <script src="site_libs/quarto-html/popper.min.js"></script> @@ -174,6 +174,11 @@ code span.wa { color: #60a0b0; font-weight: bold; font-style: italic; } /* Warni <div class="sidebar-item-container"> <a href="./03-vector_data.html" class="sidebar-item-text sidebar-link active"><span class="chapter-number">3</span> <span class="chapter-title">Vector Data</span></a> </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./05-mapping_with_r.html" class="sidebar-item-text sidebar-link"><span class="chapter-number">4</span> <span class="chapter-title">Mapping With R</span></a> + </div> </li> <li class="sidebar-item"> <div class="sidebar-item-container"> @@ -485,22 +490,22 @@ First 10 features: <h3 data-number="3.5.1" class="anchored" data-anchor-id="intersections"><span class="header-section-number">3.5.1</span> Intersections</h3> <p>Selection of roads that are intersecting <strong>dangkao</strong> district</p> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb21"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb21-1"><a href="#cb21-1" aria-hidden="true" tabindex="-1"></a>road <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"road"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<div class="sourceCode cell-code" id="cb21"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb21-1"><a href="#cb21-1" aria-hidden="true" tabindex="-1"></a>road <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"road"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="sc">%>%</span> <span class="fu">st_cast</span>(<span class="st">"LINESTRING"</span>)</span> <span id="cb21-2"><a href="#cb21-2" aria-hidden="true" tabindex="-1"></a>dangkao <span class="ot"><-</span> district[district<span class="sc">$</span>ADM2_EN <span class="sc">==</span> <span class="st">"Dangkao"</span>, ]</span> <span id="cb21-3"><a href="#cb21-3" aria-hidden="true" tabindex="-1"></a>inter <span class="ot"><-</span> <span class="fu">st_intersects</span>(<span class="at">x =</span> road, <span class="at">y =</span> dangkao, <span class="at">sparse =</span> <span class="cn">FALSE</span>)</span> <span id="cb21-4"><a href="#cb21-4" aria-hidden="true" tabindex="-1"></a><span class="fu">head</span>(inter)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> -<pre class="code-out"><code> [,1] -[1,] TRUE -[2,] TRUE -[3,] TRUE -[4,] TRUE -[5,] TRUE -[6,] TRUE</code></pre> +<pre class="code-out"><code> [,1] +[1,] FALSE +[2,] FALSE +[3,] FALSE +[4,] FALSE +[5,] FALSE +[6,] FALSE</code></pre> </div> <div class="sourceCode cell-code" id="cb23"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb23-1"><a href="#cb23-1" aria-hidden="true" tabindex="-1"></a><span class="fu">dim</span>(inter)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> -<pre class="code-out"><code>[1] 6 1</code></pre> +<pre class="code-out"><code>[1] 108285 1</code></pre> </div> </div> <p>The <strong>inter</strong> object is a matrix which indicates for each of element of the <strong>road</strong> object (6 elements) whether it intersects each elements the <strong>dangkao</strong> object (1 element). The dimension of the matrix is therefore indeed 6 rows * 1 column. Note the use of the parameter <code>sparse = FALSE</code> here. It is then possible to create a column from this object:</p> @@ -560,12 +565,12 @@ was `intersects' <div class="cell" data-nm="true"> <div class="sourceCode cell-code" id="cb30"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb30-1"><a href="#cb30-1" aria-hidden="true" tabindex="-1"></a>road<span class="sc">$</span>within_dangkao <span class="ot"><-</span> <span class="fu">st_within</span>(road, dangkao, <span class="at">sparse =</span> <span class="cn">FALSE</span>)</span> <span id="cb30-2"><a href="#cb30-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dangkao), <span class="at">col =</span> <span class="st">"lightblue"</span>)</span> -<span id="cb30-3"><a href="#cb30-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(road), <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<span id="cb30-3"><a href="#cb30-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(road), <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb30-4"><a href="#cb30-4" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(road[road<span class="sc">$</span>within_dangkao, ]), <span class="at">col =</span> <span class="st">"tomato"</span>,</span> +<span id="cb30-5"><a href="#cb30-5" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/within-1.png" class="img-fluid" width="672"></p> </div> -<div class="sourceCode cell-code" id="cb31"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb31-1"><a href="#cb31-1" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(road[road<span class="sc">$</span>within_dangkao, ]), <span class="at">col =</span> <span class="st">"tomato"</span>,</span> -<span id="cb31-2"><a href="#cb31-2" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> </div> </section> </section> @@ -574,9 +579,9 @@ was `intersects' <section id="extract-centroids" class="level3" data-number="3.6.1"> <h3 data-number="3.6.1" class="anchored" data-anchor-id="extract-centroids"><span class="header-section-number">3.6.1</span> Extract centroids</h3> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb32"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb32-1"><a href="#cb32-1" aria-hidden="true" tabindex="-1"></a>dist_c <span class="ot"><-</span> <span class="fu">st_centroid</span>(district)</span> -<span id="cb32-2"><a href="#cb32-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district))</span> -<span id="cb32-3"><a href="#cb32-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dist_c), <span class="at">add =</span> <span class="cn">TRUE</span>, <span class="at">cex =</span> <span class="fl">1.2</span>, <span class="at">col =</span> <span class="st">"red"</span>, <span class="at">pch =</span> <span class="dv">20</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb31"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb31-1"><a href="#cb31-1" aria-hidden="true" tabindex="-1"></a>dist_c <span class="ot"><-</span> <span class="fu">st_centroid</span>(district)</span> +<span id="cb31-2"><a href="#cb31-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district))</span> +<span id="cb31-3"><a href="#cb31-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dist_c), <span class="at">add =</span> <span class="cn">TRUE</span>, <span class="at">cex =</span> <span class="fl">1.2</span>, <span class="at">col =</span> <span class="st">"red"</span>, <span class="at">pch =</span> <span class="dv">20</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/centroid-1.png" class="img-fluid" width="672"></p> </div> @@ -585,9 +590,9 @@ was `intersects' <section id="aggregate-polygons" class="level3" data-number="3.6.2"> <h3 data-number="3.6.2" class="anchored" data-anchor-id="aggregate-polygons"><span class="header-section-number">3.6.2</span> Aggregate polygons</h3> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb33"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb33-1"><a href="#cb33-1" aria-hidden="true" tabindex="-1"></a>cambodia_dist <span class="ot"><-</span> <span class="fu">st_union</span>(district) </span> -<span id="cb33-2"><a href="#cb33-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district), <span class="at">col =</span> <span class="st">"lightblue"</span>)</span> -<span id="cb33-3"><a href="#cb33-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(cambodia_dist), <span class="at">add =</span> <span class="cn">TRUE</span>, <span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">border =</span> <span class="st">"red"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb32"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb32-1"><a href="#cb32-1" aria-hidden="true" tabindex="-1"></a>cambodia_dist <span class="ot"><-</span> <span class="fu">st_union</span>(district) </span> +<span id="cb32-2"><a href="#cb32-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district), <span class="at">col =</span> <span class="st">"lightblue"</span>)</span> +<span id="cb32-3"><a href="#cb32-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(cambodia_dist), <span class="at">add =</span> <span class="cn">TRUE</span>, <span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">border =</span> <span class="st">"red"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/aggreg-1.png" class="img-fluid" width="672"></p> </div> @@ -596,10 +601,10 @@ was `intersects' <section id="aggregate-polygons-based-on-a-variable" class="level3" data-number="3.6.3"> <h3 data-number="3.6.3" class="anchored" data-anchor-id="aggregate-polygons-based-on-a-variable"><span class="header-section-number">3.6.3</span> Aggregate polygons based on a variable</h3> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb34"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb34-1"><a href="#cb34-1" aria-hidden="true" tabindex="-1"></a>dist_union <span class="ot"><-</span> <span class="fu">aggregate</span>(<span class="at">x =</span> district[,<span class="fu">c</span>(<span class="st">"T_POP"</span>)],</span> -<span id="cb34-2"><a href="#cb34-2" aria-hidden="true" tabindex="-1"></a> <span class="at">by =</span> <span class="fu">list</span>(<span class="at">STATUT =</span> district<span class="sc">$</span>Status),</span> -<span id="cb34-3"><a href="#cb34-3" aria-hidden="true" tabindex="-1"></a> <span class="at">FUN =</span> <span class="st">"sum"</span>)</span> -<span id="cb34-4"><a href="#cb34-4" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(dist_union)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb33"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb33-1"><a href="#cb33-1" aria-hidden="true" tabindex="-1"></a>dist_union <span class="ot"><-</span> <span class="fu">aggregate</span>(<span class="at">x =</span> district[,<span class="fu">c</span>(<span class="st">"T_POP"</span>)],</span> +<span id="cb33-2"><a href="#cb33-2" aria-hidden="true" tabindex="-1"></a> <span class="at">by =</span> <span class="fu">list</span>(<span class="at">STATUT =</span> district<span class="sc">$</span>Status),</span> +<span id="cb33-3"><a href="#cb33-3" aria-hidden="true" tabindex="-1"></a> <span class="at">FUN =</span> <span class="st">"sum"</span>)</span> +<span id="cb33-4"><a href="#cb33-4" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(dist_union)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/aggreg2-1.png" class="img-fluid" width="672"></p> </div> @@ -608,9 +613,9 @@ was `intersects' <section id="create-a-buffer-zone" class="level3" data-number="3.6.4"> <h3 data-number="3.6.4" class="anchored" data-anchor-id="create-a-buffer-zone"><span class="header-section-number">3.6.4</span> Create a buffer zone</h3> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb35"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb35-1"><a href="#cb35-1" aria-hidden="true" tabindex="-1"></a>dangkao_buffer <span class="ot"><-</span> <span class="fu">st_buffer</span>(<span class="at">x =</span> dangkao, <span class="at">dist =</span> <span class="dv">1000</span>)</span> -<span id="cb35-2"><a href="#cb35-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dangkao_buffer), <span class="at">col =</span> <span class="st">"#E8DAEF"</span>, <span class="at">lwd=</span><span class="dv">2</span>, <span class="at">border =</span> <span class="st">"#6C3483"</span>)</span> -<span id="cb35-3"><a href="#cb35-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dangkao), <span class="at">add =</span> <span class="cn">TRUE</span>, <span class="at">lwd =</span> <span class="dv">2</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb34"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb34-1"><a href="#cb34-1" aria-hidden="true" tabindex="-1"></a>dangkao_buffer <span class="ot"><-</span> <span class="fu">st_buffer</span>(<span class="at">x =</span> dangkao, <span class="at">dist =</span> <span class="dv">1000</span>)</span> +<span id="cb34-2"><a href="#cb34-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dangkao_buffer), <span class="at">col =</span> <span class="st">"#E8DAEF"</span>, <span class="at">lwd=</span><span class="dv">2</span>, <span class="at">border =</span> <span class="st">"#6C3483"</span>)</span> +<span id="cb34-3"><a href="#cb34-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dangkao), <span class="at">add =</span> <span class="cn">TRUE</span>, <span class="at">lwd =</span> <span class="dv">2</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/buffers-1.png" class="img-fluid" width="672"></p> </div> @@ -620,24 +625,24 @@ was `intersects' <h3 data-number="3.6.5" class="anchored" data-anchor-id="making-an-intersection"><span class="header-section-number">3.6.5</span> Making an intersection</h3> <p>By using the function <code>st_intersection()</code> we will cut one layer by another.</p> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb36"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb36-1"><a href="#cb36-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(magrittr)</span> -<span id="cb36-2"><a href="#cb36-2" aria-hidden="true" tabindex="-1"></a><span class="co"># creation of a buffer zone around the centroid of the municipality of Dangkao district</span></span> -<span id="cb36-3"><a href="#cb36-3" aria-hidden="true" tabindex="-1"></a><span class="co"># using the pipe</span></span> -<span id="cb36-4"><a href="#cb36-4" aria-hidden="true" tabindex="-1"></a>zone <span class="ot"><-</span> <span class="fu">st_geometry</span>(dangkao) <span class="sc">%>%</span></span> -<span id="cb36-5"><a href="#cb36-5" aria-hidden="true" tabindex="-1"></a> <span class="fu">st_centroid</span>() <span class="sc">%>%</span></span> -<span id="cb36-6"><a href="#cb36-6" aria-hidden="true" tabindex="-1"></a> <span class="fu">st_buffer</span>(<span class="dv">30000</span>)</span> -<span id="cb36-7"><a href="#cb36-7" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district))</span> -<span id="cb36-8"><a href="#cb36-8" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(zone, <span class="at">border =</span> <span class="st">"#F06292"</span>, <span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb35"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb35-1"><a href="#cb35-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(magrittr)</span> +<span id="cb35-2"><a href="#cb35-2" aria-hidden="true" tabindex="-1"></a><span class="co"># creation of a buffer zone around the centroid of the municipality of Dangkao district</span></span> +<span id="cb35-3"><a href="#cb35-3" aria-hidden="true" tabindex="-1"></a><span class="co"># using the pipe</span></span> +<span id="cb35-4"><a href="#cb35-4" aria-hidden="true" tabindex="-1"></a>zone <span class="ot"><-</span> <span class="fu">st_geometry</span>(dangkao) <span class="sc">%>%</span></span> +<span id="cb35-5"><a href="#cb35-5" aria-hidden="true" tabindex="-1"></a> <span class="fu">st_centroid</span>() <span class="sc">%>%</span></span> +<span id="cb35-6"><a href="#cb35-6" aria-hidden="true" tabindex="-1"></a> <span class="fu">st_buffer</span>(<span class="dv">30000</span>)</span> +<span id="cb35-7"><a href="#cb35-7" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district))</span> +<span id="cb35-8"><a href="#cb35-8" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(zone, <span class="at">border =</span> <span class="st">"#F06292"</span>, <span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/intersect2-1.png" class="img-fluid" width="672"></p> </div> -<div class="sourceCode cell-code" id="cb37"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb37-1"><a href="#cb37-1" aria-hidden="true" tabindex="-1"></a>dist_z <span class="ot"><-</span> <span class="fu">st_intersection</span>(<span class="at">x =</span> district, <span class="at">y =</span> zone)</span> -<span id="cb37-2"><a href="#cb37-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district))</span> -<span id="cb37-3"><a href="#cb37-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dist_z), <span class="at">col=</span><span class="st">"#AF7AC5"</span>, <span class="at">border=</span><span class="st">"#F9E79F"</span>, <span class="at">add=</span>T)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb36"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb36-1"><a href="#cb36-1" aria-hidden="true" tabindex="-1"></a>dist_z <span class="ot"><-</span> <span class="fu">st_intersection</span>(<span class="at">x =</span> district, <span class="at">y =</span> zone)</span> +<span id="cb36-2"><a href="#cb36-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district))</span> +<span id="cb36-3"><a href="#cb36-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dist_z), <span class="at">col=</span><span class="st">"#AF7AC5"</span>, <span class="at">border=</span><span class="st">"#F9E79F"</span>, <span class="at">add=</span>T)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/intersect2-2.png" class="img-fluid" width="672"></p> </div> -<div class="sourceCode cell-code" id="cb38"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb38-1"><a href="#cb38-1" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dist_z))</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb37"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb37-1"><a href="#cb37-1" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(dist_z))</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/intersect2-3.png" class="img-fluid" width="672"></p> </div> @@ -647,11 +652,11 @@ was `intersects' <h3 data-number="3.6.6" class="anchored" data-anchor-id="create-regular-grid"><span class="header-section-number">3.6.6</span> Create regular grid</h3> <p>The function <code>st_make_grid()</code> allows you to create regular grid. The function produce and object <code>sfc</code>, you must then use the function <code>st_sf()</code> to transform the object <code>sfc</code> into and object <code>sf</code>. During this transformation we add here a column of unique identifiers.</p> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb39"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb39-1"><a href="#cb39-1" aria-hidden="true" tabindex="-1"></a>grid <span class="ot"><-</span> <span class="fu">st_make_grid</span>(<span class="at">x =</span> district, <span class="at">cellsize =</span> <span class="dv">10000</span>)</span> -<span id="cb39-2"><a href="#cb39-2" aria-hidden="true" tabindex="-1"></a>grid <span class="ot"><-</span> <span class="fu">st_sf</span>(<span class="at">ID =</span> <span class="dv">1</span><span class="sc">:</span><span class="fu">length</span>(grid), <span class="at">geom =</span> grid)</span> -<span id="cb39-3"><a href="#cb39-3" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb39-4"><a href="#cb39-4" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(grid), <span class="at">col =</span> <span class="st">"grey"</span>, <span class="at">border =</span> <span class="st">"white"</span>)</span> -<span id="cb39-5"><a href="#cb39-5" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district), <span class="at">border =</span> <span class="st">"grey50"</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb38"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb38-1"><a href="#cb38-1" aria-hidden="true" tabindex="-1"></a>grid <span class="ot"><-</span> <span class="fu">st_make_grid</span>(<span class="at">x =</span> district, <span class="at">cellsize =</span> <span class="dv">10000</span>)</span> +<span id="cb38-2"><a href="#cb38-2" aria-hidden="true" tabindex="-1"></a>grid <span class="ot"><-</span> <span class="fu">st_sf</span>(<span class="at">ID =</span> <span class="dv">1</span><span class="sc">:</span><span class="fu">length</span>(grid), <span class="at">geom =</span> grid)</span> +<span id="cb38-3"><a href="#cb38-3" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb38-4"><a href="#cb38-4" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(grid), <span class="at">col =</span> <span class="st">"grey"</span>, <span class="at">border =</span> <span class="st">"white"</span>)</span> +<span id="cb38-5"><a href="#cb38-5" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(district), <span class="at">border =</span> <span class="st">"grey50"</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/grid-1.png" class="img-fluid" width="672"></p> </div> @@ -660,19 +665,19 @@ was `intersects' <section id="counting-points-in-a-polygon-in-a-grid-tile" class="level3" data-number="3.6.7"> <h3 data-number="3.6.7" class="anchored" data-anchor-id="counting-points-in-a-polygon-in-a-grid-tile"><span class="header-section-number">3.6.7</span> Counting points in a polygon (in a grid tile)</h3> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb40"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb40-1"><a href="#cb40-1" aria-hidden="true" tabindex="-1"></a><span class="co"># selection of grid tiles that intersect the district</span></span> -<span id="cb40-2"><a href="#cb40-2" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb40-3"><a href="#cb40-3" aria-hidden="true" tabindex="-1"></a>inter <span class="ot"><-</span> <span class="fu">st_intersects</span>(grid, cambodia_dist, <span class="at">sparse =</span> <span class="cn">FALSE</span>)</span> -<span id="cb40-4"><a href="#cb40-4" aria-hidden="true" tabindex="-1"></a>grid <span class="ot"><-</span> grid[inter, ]</span> -<span id="cb40-5"><a href="#cb40-5" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb40-6"><a href="#cb40-6" aria-hidden="true" tabindex="-1"></a>case_cambodia <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"cases"</span> , <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> -<span id="cb40-7"><a href="#cb40-7" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(grid), <span class="at">col =</span> <span class="st">"grey"</span>, <span class="at">border =</span> <span class="st">"white"</span>)</span> -<span id="cb40-8"><a href="#cb40-8" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(case_cambodia), <span class="at">pch =</span> <span class="dv">20</span>, <span class="at">col =</span> <span class="st">"red"</span>, <span class="at">add =</span> <span class="cn">TRUE</span>, <span class="at">cex =</span> <span class="fl">0.8</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb39"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb39-1"><a href="#cb39-1" aria-hidden="true" tabindex="-1"></a><span class="co"># selection of grid tiles that intersect the district</span></span> +<span id="cb39-2"><a href="#cb39-2" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb39-3"><a href="#cb39-3" aria-hidden="true" tabindex="-1"></a>inter <span class="ot"><-</span> <span class="fu">st_intersects</span>(grid, cambodia_dist, <span class="at">sparse =</span> <span class="cn">FALSE</span>)</span> +<span id="cb39-4"><a href="#cb39-4" aria-hidden="true" tabindex="-1"></a>grid <span class="ot"><-</span> grid[inter, ]</span> +<span id="cb39-5"><a href="#cb39-5" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb39-6"><a href="#cb39-6" aria-hidden="true" tabindex="-1"></a>case_cambodia <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"cases"</span> , <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<span id="cb39-7"><a href="#cb39-7" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(grid), <span class="at">col =</span> <span class="st">"grey"</span>, <span class="at">border =</span> <span class="st">"white"</span>)</span> +<span id="cb39-8"><a href="#cb39-8" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(case_cambodia), <span class="at">pch =</span> <span class="dv">20</span>, <span class="at">col =</span> <span class="st">"red"</span>, <span class="at">add =</span> <span class="cn">TRUE</span>, <span class="at">cex =</span> <span class="fl">0.8</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/intersect3.1-1.png" class="img-fluid" width="672"></p> </div> -<div class="sourceCode cell-code" id="cb41"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb41-1"><a href="#cb41-1" aria-hidden="true" tabindex="-1"></a>inter <span class="ot"><-</span> <span class="fu">st_intersects</span>(grid, case_cambodia, <span class="at">sparse =</span> <span class="cn">TRUE</span>)</span> -<span id="cb41-2"><a href="#cb41-2" aria-hidden="true" tabindex="-1"></a><span class="fu">length</span>(inter)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb40"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb40-1"><a href="#cb40-1" aria-hidden="true" tabindex="-1"></a>inter <span class="ot"><-</span> <span class="fu">st_intersects</span>(grid, case_cambodia, <span class="at">sparse =</span> <span class="cn">TRUE</span>)</span> +<span id="cb40-2"><a href="#cb40-2" aria-hidden="true" tabindex="-1"></a><span class="fu">length</span>(inter)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> <pre class="code-out"><code>[1] 1964</code></pre> </div> @@ -680,23 +685,23 @@ was `intersects' <p>Here we use the argument <code>sparse = TRUE</code>. The <strong>inter</strong> object is a list the length of the <strong>grid</strong> and each item in the list contain the index of the object items of <strong>cases</strong> and <strong>grid</strong> intersection.</p> <p>For example <strong>grid tile</strong> 35th intersect with four <strong>cases</strong> 97, 138, 189, 522, 624, 696</p> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb43"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb43-1"><a href="#cb43-1" aria-hidden="true" tabindex="-1"></a>inter[<span class="dv">35</span>]</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb42"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb42-1"><a href="#cb42-1" aria-hidden="true" tabindex="-1"></a>inter[<span class="dv">35</span>]</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> <pre class="code-out"><code>[[1]] [1] 97 138 189 522 624 696</code></pre> </div> -<div class="sourceCode cell-code" id="cb45"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb45-1"><a href="#cb45-1" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(grid[<span class="dv">35</span>, ]))</span> -<span id="cb45-2"><a href="#cb45-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(case_cambodia), <span class="at">add =</span> T)</span> -<span id="cb45-3"><a href="#cb45-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(case_cambodia[<span class="fu">c</span>(<span class="dv">97</span>, <span class="dv">138</span>, <span class="dv">189</span>, <span class="dv">522</span>, <span class="dv">624</span>, <span class="dv">696</span>), ]), </span> -<span id="cb45-4"><a href="#cb45-4" aria-hidden="true" tabindex="-1"></a> <span class="at">col =</span> <span class="st">"red"</span>, <span class="at">pch =</span> <span class="dv">19</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb44"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb44-1"><a href="#cb44-1" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(grid[<span class="dv">35</span>, ]))</span> +<span id="cb44-2"><a href="#cb44-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(case_cambodia), <span class="at">add =</span> T)</span> +<span id="cb44-3"><a href="#cb44-3" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(case_cambodia[<span class="fu">c</span>(<span class="dv">97</span>, <span class="dv">138</span>, <span class="dv">189</span>, <span class="dv">522</span>, <span class="dv">624</span>, <span class="dv">696</span>), ]), </span> +<span id="cb44-4"><a href="#cb44-4" aria-hidden="true" tabindex="-1"></a> <span class="at">col =</span> <span class="st">"red"</span>, <span class="at">pch =</span> <span class="dv">19</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/intersect3.3-1.png" class="img-fluid" width="672"></p> </div> </div> <p>To count number of <strong>case</strong>, simply go to the list and report length of the elements.</p> <div class="cell"> -<div class="sourceCode cell-code" id="cb46"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb46-1"><a href="#cb46-1" aria-hidden="true" tabindex="-1"></a>grid<span class="sc">$</span>nb_case <span class="ot"><-</span> <span class="fu">sapply</span>(<span class="at">X =</span> inter, <span class="at">FUN =</span> length) <span class="co"># create 'nb_case' column to store number of health centers in each grid tile </span></span> -<span id="cb46-2"><a href="#cb46-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(grid[<span class="st">"nb_case"</span>])</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb45"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb45-1"><a href="#cb45-1" aria-hidden="true" tabindex="-1"></a>grid<span class="sc">$</span>nb_case <span class="ot"><-</span> <span class="fu">sapply</span>(<span class="at">X =</span> inter, <span class="at">FUN =</span> length) <span class="co"># create 'nb_case' column to store number of health centers in each grid tile </span></span> +<span id="cb45-2"><a href="#cb45-2" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(grid[<span class="st">"nb_case"</span>])</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/intersect3.4-1.png" class="img-fluid" width="672"></p> </div> @@ -707,12 +712,12 @@ was `intersects' <p>In this example we import a csv file that contain data from a population grid. Once import we transform it <code>data.frame</code> into an object <code>sf</code>.</p> <p>The objective is to aggregate the values id these points (the population contained in the “DENs†field) in the municipalities of the district.</p> <div class="cell"> -<div class="sourceCode cell-code" id="cb47"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb47-1"><a href="#cb47-1" aria-hidden="true" tabindex="-1"></a>pp_pop_raw <span class="ot"><-</span> <span class="fu">read.csv</span>(<span class="st">"data_cambodia/pp_pop_dens.csv"</span>) <span class="co"># import file</span></span> -<span id="cb47-2"><a href="#cb47-2" aria-hidden="true" tabindex="-1"></a>pp_pop_raw<span class="sc">$</span>id <span class="ot"><-</span> <span class="dv">1</span><span class="sc">:</span><span class="fu">nrow</span>(pp_pop_raw) <span class="co"># adding a unique identifier</span></span> -<span id="cb47-3"><a href="#cb47-3" aria-hidden="true" tabindex="-1"></a>pp_pop <span class="ot"><-</span> <span class="fu">st_as_sf</span>(pp_pop_raw, <span class="at">coords =</span> <span class="fu">c</span>(<span class="st">"X"</span>, <span class="st">"Y"</span>), <span class="at">crs =</span> <span class="dv">32648</span>) <span class="co"># Transform into object sf</span></span> -<span id="cb47-4"><a href="#cb47-4" aria-hidden="true" tabindex="-1"></a>pp_pop <span class="ot"><-</span> <span class="fu">st_transform</span>(pp_pop, <span class="fu">st_crs</span>(district)) <span class="co"># Transform projection</span></span> -<span id="cb47-5"><a href="#cb47-5" aria-hidden="true" tabindex="-1"></a>inter <span class="ot"><-</span> <span class="fu">st_intersection</span>(pp_pop, district) <span class="co"># Intersection</span></span> -<span id="cb47-6"><a href="#cb47-6" aria-hidden="true" tabindex="-1"></a>inter</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb46"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb46-1"><a href="#cb46-1" aria-hidden="true" tabindex="-1"></a>pp_pop_raw <span class="ot"><-</span> <span class="fu">read.csv</span>(<span class="st">"data_cambodia/pp_pop_dens.csv"</span>) <span class="co"># import file</span></span> +<span id="cb46-2"><a href="#cb46-2" aria-hidden="true" tabindex="-1"></a>pp_pop_raw<span class="sc">$</span>id <span class="ot"><-</span> <span class="dv">1</span><span class="sc">:</span><span class="fu">nrow</span>(pp_pop_raw) <span class="co"># adding a unique identifier</span></span> +<span id="cb46-3"><a href="#cb46-3" aria-hidden="true" tabindex="-1"></a>pp_pop <span class="ot"><-</span> <span class="fu">st_as_sf</span>(pp_pop_raw, <span class="at">coords =</span> <span class="fu">c</span>(<span class="st">"X"</span>, <span class="st">"Y"</span>), <span class="at">crs =</span> <span class="dv">32648</span>) <span class="co"># Transform into object sf</span></span> +<span id="cb46-4"><a href="#cb46-4" aria-hidden="true" tabindex="-1"></a>pp_pop <span class="ot"><-</span> <span class="fu">st_transform</span>(pp_pop, <span class="fu">st_crs</span>(district)) <span class="co"># Transform projection</span></span> +<span id="cb46-5"><a href="#cb46-5" aria-hidden="true" tabindex="-1"></a>inter <span class="ot"><-</span> <span class="fu">st_intersection</span>(pp_pop, district) <span class="co"># Intersection</span></span> +<span id="cb46-6"><a href="#cb46-6" aria-hidden="true" tabindex="-1"></a>inter</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> <pre class="code-out"><code>Simple feature collection with 1295 features and 12 fields Geometry type: POINT @@ -747,10 +752,10 @@ First 10 features: <p>By using the function <code>st_intersection()</code> we add to each point of the grid all the information on the municipality in which it is located.</p> <p>We can then use the function <code>aggregate()</code> to aggregate the population by municipalities.</p> <div class="cell"> -<div class="sourceCode cell-code" id="cb49"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb49-1"><a href="#cb49-1" aria-hidden="true" tabindex="-1"></a>resultat <span class="ot"><-</span> <span class="fu">aggregate</span>(<span class="at">x =</span> <span class="fu">list</span>(<span class="at">pop_from_grid =</span> inter<span class="sc">$</span>DENs), </span> -<span id="cb49-2"><a href="#cb49-2" aria-hidden="true" tabindex="-1"></a> <span class="at">by =</span> <span class="fu">list</span>(<span class="at">ADM2_EN =</span> inter<span class="sc">$</span>ADM2_EN), </span> -<span id="cb49-3"><a href="#cb49-3" aria-hidden="true" tabindex="-1"></a> <span class="at">FUN =</span> <span class="st">"sum"</span>)</span> -<span id="cb49-4"><a href="#cb49-4" aria-hidden="true" tabindex="-1"></a><span class="fu">head</span>(resultat)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb48"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb48-1"><a href="#cb48-1" aria-hidden="true" tabindex="-1"></a>resultat <span class="ot"><-</span> <span class="fu">aggregate</span>(<span class="at">x =</span> <span class="fu">list</span>(<span class="at">pop_from_grid =</span> inter<span class="sc">$</span>DENs), </span> +<span id="cb48-2"><a href="#cb48-2" aria-hidden="true" tabindex="-1"></a> <span class="at">by =</span> <span class="fu">list</span>(<span class="at">ADM2_EN =</span> inter<span class="sc">$</span>ADM2_EN), </span> +<span id="cb48-3"><a href="#cb48-3" aria-hidden="true" tabindex="-1"></a> <span class="at">FUN =</span> <span class="st">"sum"</span>)</span> +<span id="cb48-4"><a href="#cb48-4" aria-hidden="true" tabindex="-1"></a><span class="fu">head</span>(resultat)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> <pre class="code-out"><code> ADM2_EN pop_from_grid 1 Angk Snuol NA @@ -763,8 +768,8 @@ First 10 features: </div> <p>We can then create a new object with this result.</p> <div class="cell"> -<div class="sourceCode cell-code" id="cb51"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb51-1"><a href="#cb51-1" aria-hidden="true" tabindex="-1"></a>dist_result <span class="ot"><-</span> <span class="fu">merge</span>(district, resultat, <span class="at">by =</span> <span class="st">"ADM2_EN"</span>, <span class="at">all.x =</span> <span class="cn">TRUE</span>)</span> -<span id="cb51-2"><a href="#cb51-2" aria-hidden="true" tabindex="-1"></a>dist_result</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb50"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb50-1"><a href="#cb50-1" aria-hidden="true" tabindex="-1"></a>dist_result <span class="ot"><-</span> <span class="fu">merge</span>(district, resultat, <span class="at">by =</span> <span class="st">"ADM2_EN"</span>, <span class="at">all.x =</span> <span class="cn">TRUE</span>)</span> +<span id="cb50-2"><a href="#cb50-2" aria-hidden="true" tabindex="-1"></a>dist_result</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> <pre class="code-out"><code>Simple feature collection with 197 features and 11 fields Geometry type: MULTIPOLYGON @@ -804,8 +809,8 @@ First 10 features: <h3 data-number="3.7.1" class="anchored" data-anchor-id="create-a-distance-matrix"><span class="header-section-number">3.7.1</span> Create a distance matrix</h3> <p>If the dataset’s projection system is specified, the distance are expressed in the projection measurement unit (most often in meter)</p> <div class="cell" data-nm="true"> -<div class="sourceCode cell-code" id="cb53"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb53-1"><a href="#cb53-1" aria-hidden="true" tabindex="-1"></a>mat <span class="ot"><-</span> <span class="fu">st_distance</span>(<span class="at">x =</span> dist_c, <span class="at">y =</span> dist_c)</span> -<span id="cb53-2"><a href="#cb53-2" aria-hidden="true" tabindex="-1"></a>mat[<span class="dv">1</span><span class="sc">:</span><span class="dv">5</span>,<span class="dv">1</span><span class="sc">:</span><span class="dv">5</span>]</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb52"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb52-1"><a href="#cb52-1" aria-hidden="true" tabindex="-1"></a>mat <span class="ot"><-</span> <span class="fu">st_distance</span>(<span class="at">x =</span> dist_c, <span class="at">y =</span> dist_c)</span> +<span id="cb52-2"><a href="#cb52-2" aria-hidden="true" tabindex="-1"></a>mat[<span class="dv">1</span><span class="sc">:</span><span class="dv">5</span>,<span class="dv">1</span><span class="sc">:</span><span class="dv">5</span>]</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> <pre class="code-out"><code>Units: [m] [,1] [,2] [,3] [,4] [,5] @@ -824,21 +829,21 @@ First 10 features: <h4 data-number="3.7.2.1" class="anchored" data-anchor-id="calculate-a-route"><span class="header-section-number">3.7.2.1</span> Calculate a route</h4> <p>The fonction <code>osrmRoute()</code> allows you to calculate routes.</p> <div class="cell"> -<div class="sourceCode cell-code" id="cb55"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb55-1"><a href="#cb55-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(sf)</span> -<span id="cb55-2"><a href="#cb55-2" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(osrm)</span> -<span id="cb55-3"><a href="#cb55-3" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(maptiles)</span> -<span id="cb55-4"><a href="#cb55-4" aria-hidden="true" tabindex="-1"></a>district <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>,<span class="at">layer =</span> <span class="st">"district"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> -<span id="cb55-5"><a href="#cb55-5" aria-hidden="true" tabindex="-1"></a>district <span class="ot"><-</span> <span class="fu">st_transform</span>(district, <span class="dv">32648</span>)</span> -<span id="cb55-6"><a href="#cb55-6" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb55-7"><a href="#cb55-7" aria-hidden="true" tabindex="-1"></a>odongk <span class="ot"><-</span> district[district<span class="sc">$</span>ADM2_PCODE <span class="sc">==</span> <span class="st">"KH0505"</span>, ] <span class="co"># Itinerary between Odongk district and Toul Kouk</span></span> -<span id="cb55-8"><a href="#cb55-8" aria-hidden="true" tabindex="-1"></a>takmau <span class="ot"><-</span> district[district<span class="sc">$</span>ADM2_PCODE <span class="sc">==</span> <span class="st">"KH0811"</span>,]</span> -<span id="cb55-9"><a href="#cb55-9" aria-hidden="true" tabindex="-1"></a>route <span class="ot"><-</span> <span class="fu">osrmRoute</span>(<span class="at">src =</span> odongk, </span> -<span id="cb55-10"><a href="#cb55-10" aria-hidden="true" tabindex="-1"></a> <span class="at">dst =</span> takmau, </span> -<span id="cb55-11"><a href="#cb55-11" aria-hidden="true" tabindex="-1"></a> <span class="at">returnclass =</span> <span class="st">"sf"</span>)</span> -<span id="cb55-12"><a href="#cb55-12" aria-hidden="true" tabindex="-1"></a>osm <span class="ot"><-</span> <span class="fu">get_tiles</span>(route, <span class="at">crop =</span> <span class="cn">TRUE</span>)</span> -<span id="cb55-13"><a href="#cb55-13" aria-hidden="true" tabindex="-1"></a><span class="fu">plot_tiles</span>(osm)</span> -<span id="cb55-14"><a href="#cb55-14" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(route), <span class="at">col =</span> <span class="st">"#b23a5f"</span>, <span class="at">lwd =</span> <span class="dv">6</span>, <span class="at">add =</span> T)</span> -<span id="cb55-15"><a href="#cb55-15" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(route), <span class="at">col =</span> <span class="st">"#eee0e5"</span>, <span class="at">lwd =</span> <span class="dv">1</span>, <span class="at">add =</span> T)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb54"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb54-1"><a href="#cb54-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(sf)</span> +<span id="cb54-2"><a href="#cb54-2" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(osrm)</span> +<span id="cb54-3"><a href="#cb54-3" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(maptiles)</span> +<span id="cb54-4"><a href="#cb54-4" aria-hidden="true" tabindex="-1"></a>district <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>,<span class="at">layer =</span> <span class="st">"district"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<span id="cb54-5"><a href="#cb54-5" aria-hidden="true" tabindex="-1"></a>district <span class="ot"><-</span> <span class="fu">st_transform</span>(district, <span class="dv">32648</span>)</span> +<span id="cb54-6"><a href="#cb54-6" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb54-7"><a href="#cb54-7" aria-hidden="true" tabindex="-1"></a>odongk <span class="ot"><-</span> district[district<span class="sc">$</span>ADM2_PCODE <span class="sc">==</span> <span class="st">"KH0505"</span>, ] <span class="co"># Itinerary between Odongk district and Toul Kouk</span></span> +<span id="cb54-8"><a href="#cb54-8" aria-hidden="true" tabindex="-1"></a>takmau <span class="ot"><-</span> district[district<span class="sc">$</span>ADM2_PCODE <span class="sc">==</span> <span class="st">"KH0811"</span>,]</span> +<span id="cb54-9"><a href="#cb54-9" aria-hidden="true" tabindex="-1"></a>route <span class="ot"><-</span> <span class="fu">osrmRoute</span>(<span class="at">src =</span> odongk, </span> +<span id="cb54-10"><a href="#cb54-10" aria-hidden="true" tabindex="-1"></a> <span class="at">dst =</span> takmau, </span> +<span id="cb54-11"><a href="#cb54-11" aria-hidden="true" tabindex="-1"></a> <span class="at">returnclass =</span> <span class="st">"sf"</span>)</span> +<span id="cb54-12"><a href="#cb54-12" aria-hidden="true" tabindex="-1"></a>osm <span class="ot"><-</span> <span class="fu">get_tiles</span>(route, <span class="at">crop =</span> <span class="cn">TRUE</span>)</span> +<span id="cb54-13"><a href="#cb54-13" aria-hidden="true" tabindex="-1"></a><span class="fu">plot_tiles</span>(osm)</span> +<span id="cb54-14"><a href="#cb54-14" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(route), <span class="at">col =</span> <span class="st">"#b23a5f"</span>, <span class="at">lwd =</span> <span class="dv">6</span>, <span class="at">add =</span> T)</span> +<span id="cb54-15"><a href="#cb54-15" aria-hidden="true" tabindex="-1"></a><span class="fu">plot</span>(<span class="fu">st_geometry</span>(route), <span class="at">col =</span> <span class="st">"#eee0e5"</span>, <span class="at">lwd =</span> <span class="dv">1</span>, <span class="at">add =</span> T)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/osrmroute-1.png" class="img-fluid" width="288"></p> </div> @@ -849,17 +854,17 @@ First 10 features: <p>The function <code>osrmTable()</code> makes it possible to calculate matrices of distances or times by road.</p> <p>In this example we calculate a time matrix between 2 addresses and health centers in Phnom Penh on foot.</p> <div class="cell"> -<div class="sourceCode cell-code" id="cb56"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb56-1"><a href="#cb56-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(sf)</span> -<span id="cb56-2"><a href="#cb56-2" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(tidygeocoder)</span> -<span id="cb56-3"><a href="#cb56-3" aria-hidden="true" tabindex="-1"></a>hospital <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>,<span class="at">layer=</span> <span class="st">"hospital"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> -<span id="cb56-4"><a href="#cb56-4" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb56-5"><a href="#cb56-5" aria-hidden="true" tabindex="-1"></a>hospital_pp <span class="ot"><-</span> hospital[hospital<span class="sc">$</span>PCODE <span class="sc">==</span> <span class="st">"12"</span>, ] <span class="co"># Selection of health centers in Phnom Penh</span></span> -<span id="cb56-6"><a href="#cb56-6" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb56-7"><a href="#cb56-7" aria-hidden="true" tabindex="-1"></a>adresses <span class="ot"><-</span> <span class="fu">data.frame</span>(<span class="at">adr =</span> <span class="fu">c</span>(<span class="st">"Royal Palace Park, Phnom Penh Phnom, Cambodia"</span>,</span> -<span id="cb56-8"><a href="#cb56-8" aria-hidden="true" tabindex="-1"></a> <span class="st">"Wat Phnom Daun Penh, Phnom Penh, Cambodia"</span>)) <span class="co"># Geocoding of 2 addresses in Phnom Penh</span></span> -<span id="cb56-9"><a href="#cb56-9" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb56-10"><a href="#cb56-10" aria-hidden="true" tabindex="-1"></a>places <span class="ot"><-</span> tidygeocoder<span class="sc">::</span><span class="fu">geocode</span>(<span class="at">.tbl =</span> adresses,<span class="at">address =</span> adr)</span> -<span id="cb56-11"><a href="#cb56-11" aria-hidden="true" tabindex="-1"></a>places</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb55"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb55-1"><a href="#cb55-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(sf)</span> +<span id="cb55-2"><a href="#cb55-2" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(tidygeocoder)</span> +<span id="cb55-3"><a href="#cb55-3" aria-hidden="true" tabindex="-1"></a>hospital <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>,<span class="at">layer=</span> <span class="st">"hospital"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<span id="cb55-4"><a href="#cb55-4" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb55-5"><a href="#cb55-5" aria-hidden="true" tabindex="-1"></a>hospital_pp <span class="ot"><-</span> hospital[hospital<span class="sc">$</span>PCODE <span class="sc">==</span> <span class="st">"12"</span>, ] <span class="co"># Selection of health centers in Phnom Penh</span></span> +<span id="cb55-6"><a href="#cb55-6" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb55-7"><a href="#cb55-7" aria-hidden="true" tabindex="-1"></a>adresses <span class="ot"><-</span> <span class="fu">data.frame</span>(<span class="at">adr =</span> <span class="fu">c</span>(<span class="st">"Royal Palace Park, Phnom Penh Phnom, Cambodia"</span>,</span> +<span id="cb55-8"><a href="#cb55-8" aria-hidden="true" tabindex="-1"></a> <span class="st">"Wat Phnom Daun Penh, Phnom Penh, Cambodia"</span>)) <span class="co"># Geocoding of 2 addresses in Phnom Penh</span></span> +<span id="cb55-9"><a href="#cb55-9" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb55-10"><a href="#cb55-10" aria-hidden="true" tabindex="-1"></a>places <span class="ot"><-</span> tidygeocoder<span class="sc">::</span><span class="fu">geocode</span>(<span class="at">.tbl =</span> adresses,<span class="at">address =</span> adr)</span> +<span id="cb55-11"><a href="#cb55-11" aria-hidden="true" tabindex="-1"></a>places</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> <pre class="code-out"><code># A tibble: 2 × 3 adr lat long @@ -867,21 +872,21 @@ First 10 features: 1 Royal Palace Park, Phnom Penh Phnom, Cambodia 11.6 105. 2 Wat Phnom Daun Penh, Phnom Penh, Cambodia 11.6 105.</code></pre> </div> -<div class="sourceCode cell-code" id="cb58"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb58-1"><a href="#cb58-1" aria-hidden="true" tabindex="-1"></a><span class="co"># Calculation of the distance matrix between the 2 addresses and the health center in Phnom Penh</span></span> -<span id="cb58-2"><a href="#cb58-2" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb58-3"><a href="#cb58-3" aria-hidden="true" tabindex="-1"></a>cal_mat <span class="ot"><-</span> <span class="fu">osrmTable</span>(<span class="at">src =</span> places[,<span class="fu">c</span>(<span class="dv">1</span>,<span class="dv">3</span>,<span class="dv">2</span>)], </span> -<span id="cb58-4"><a href="#cb58-4" aria-hidden="true" tabindex="-1"></a> <span class="at">dst =</span> hospital_pp, </span> -<span id="cb58-5"><a href="#cb58-5" aria-hidden="true" tabindex="-1"></a> <span class="at">osrm.profile =</span> <span class="st">"foot"</span>)</span> -<span id="cb58-6"><a href="#cb58-6" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb58-7"><a href="#cb58-7" aria-hidden="true" tabindex="-1"></a>cal_mat<span class="sc">$</span>durations[<span class="dv">1</span><span class="sc">:</span><span class="dv">2</span>, <span class="dv">1</span><span class="sc">:</span><span class="dv">5</span>]</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb57"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb57-1"><a href="#cb57-1" aria-hidden="true" tabindex="-1"></a><span class="co"># Calculation of the distance matrix between the 2 addresses and the health center in Phnom Penh</span></span> +<span id="cb57-2"><a href="#cb57-2" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb57-3"><a href="#cb57-3" aria-hidden="true" tabindex="-1"></a>cal_mat <span class="ot"><-</span> <span class="fu">osrmTable</span>(<span class="at">src =</span> places[,<span class="fu">c</span>(<span class="dv">1</span>,<span class="dv">3</span>,<span class="dv">2</span>)], </span> +<span id="cb57-4"><a href="#cb57-4" aria-hidden="true" tabindex="-1"></a> <span class="at">dst =</span> hospital_pp, </span> +<span id="cb57-5"><a href="#cb57-5" aria-hidden="true" tabindex="-1"></a> <span class="at">osrm.profile =</span> <span class="st">"foot"</span>)</span> +<span id="cb57-6"><a href="#cb57-6" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb57-7"><a href="#cb57-7" aria-hidden="true" tabindex="-1"></a>cal_mat<span class="sc">$</span>durations[<span class="dv">1</span><span class="sc">:</span><span class="dv">2</span>, <span class="dv">1</span><span class="sc">:</span><span class="dv">5</span>]</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output cell-output-stdout"> <pre class="code-out"><code> 684 685 686 687 691 Royal Palace Park, Phnom Penh Phnom, Cambodia 56.1 71.9 64.2 40.4 76.5 Wat Phnom Daun Penh, Phnom Penh, Cambodia 60.1 80.5 43.8 32.8 55.6</code></pre> </div> -<div class="sourceCode cell-code" id="cb60"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb60-1"><a href="#cb60-1" aria-hidden="true" tabindex="-1"></a><span class="co"># Which address has better accessibility to health center in Phnom Penh?</span></span> -<span id="cb60-2"><a href="#cb60-2" aria-hidden="true" tabindex="-1"></a></span> -<span id="cb60-3"><a href="#cb60-3" aria-hidden="true" tabindex="-1"></a><span class="fu">boxplot</span>(<span class="fu">t</span>(cal_mat<span class="sc">$</span>durations[,]), <span class="at">cex.axis =</span> <span class="fl">0.7</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="sourceCode cell-code" id="cb59"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb59-1"><a href="#cb59-1" aria-hidden="true" tabindex="-1"></a><span class="co"># Which address has better accessibility to health center in Phnom Penh?</span></span> +<span id="cb59-2"><a href="#cb59-2" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb59-3"><a href="#cb59-3" aria-hidden="true" tabindex="-1"></a><span class="fu">boxplot</span>(<span class="fu">t</span>(cal_mat<span class="sc">$</span>durations[,]), <span class="at">cex.axis =</span> <span class="fl">0.7</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> <div class="cell-output-display"> <p><img src="03-vector_data_files/figure-html/osrmtable-1.png" class="img-fluid" width="768"></p> </div> @@ -993,8 +998,8 @@ window.document.addEventListener("DOMContentLoaded", function (event) { </a> </div> <div class="nav-page nav-page-next"> - <a href="./references.html" class="pagination-link"> - <span class="nav-page-text">References</span> <i class="bi bi-arrow-right-short"></i> + <a href="./05-mapping_with_r.html" class="pagination-link"> + <span class="nav-page-text"><span class="chapter-number">4</span> <span class="chapter-title">Mapping With R</span></span> <i class="bi bi-arrow-right-short"></i> </a> </div> </nav> diff --git a/public/03-vector_data_files/figure-html/intersects2-1.png b/public/03-vector_data_files/figure-html/intersects2-1.png index 5f7fc379836df91882baf17f81440c0b903a80e0..a7e8c0b446674415417331cb78d621605ad21109 100644 Binary files a/public/03-vector_data_files/figure-html/intersects2-1.png and b/public/03-vector_data_files/figure-html/intersects2-1.png differ diff --git a/public/03-vector_data_files/figure-html/within-1.png b/public/03-vector_data_files/figure-html/within-1.png index 7a3d788f0e17f68cd3df74fe234596df7af204e5..6cf07a482f113f26b6ab55ab3c8b1c1faf64070a 100644 Binary files a/public/03-vector_data_files/figure-html/within-1.png and b/public/03-vector_data_files/figure-html/within-1.png differ diff --git a/public/05-mapping_with_r.html b/public/05-mapping_with_r.html new file mode 100644 index 0000000000000000000000000000000000000000..2702c8af8ba76ff55ad607c0a42c046b71e594ff --- /dev/null +++ b/public/05-mapping_with_r.html @@ -0,0 +1,1409 @@ +<!DOCTYPE html> +<html xmlns="http://www.w3.org/1999/xhtml" lang="en" xml:lang="en"><head> + +<meta charset="utf-8"> +<meta name="generator" content="quarto-0.9.617"> + +<meta name="viewport" content="width=device-width, initial-scale=1.0, user-scalable=yes"> + + +<title>Mapping and spatial analyses in R for One Health studies - 4 Mapping With R</title> +<style> +code{white-space: pre-wrap;} +span.smallcaps{font-variant: small-caps;} +span.underline{text-decoration: underline;} +div.column{display: inline-block; vertical-align: top; width: 50%;} +div.hanging-indent{margin-left: 1.5em; text-indent: -1.5em;} +ul.task-list{list-style: none;} +pre > code.sourceCode { white-space: pre; position: relative; } +pre > code.sourceCode > span { display: inline-block; line-height: 1.25; } +pre > code.sourceCode > span:empty { height: 1.2em; } +.sourceCode { overflow: visible; } +code.sourceCode > span { color: inherit; text-decoration: inherit; } +div.sourceCode { margin: 1em 0; } +pre.sourceCode { margin: 0; } +@media screen { +div.sourceCode { overflow: auto; } +} +@media print { +pre > code.sourceCode { white-space: pre-wrap; } +pre > code.sourceCode > span { text-indent: -5em; padding-left: 5em; } +} +pre.numberSource code + { counter-reset: source-line 0; } +pre.numberSource code > span + { position: relative; left: -4em; counter-increment: source-line; } +pre.numberSource code > span > a:first-child::before + { content: counter(source-line); + position: relative; left: -1em; text-align: right; vertical-align: baseline; + border: none; display: inline-block; + -webkit-touch-callout: none; -webkit-user-select: none; + -khtml-user-select: none; -moz-user-select: none; + -ms-user-select: none; user-select: none; + padding: 0 4px; width: 4em; + color: #aaaaaa; + } +pre.numberSource { margin-left: 3em; border-left: 1px solid #aaaaaa; padding-left: 4px; } +div.sourceCode + { } +@media screen { +pre > code.sourceCode > span > a:first-child::before { text-decoration: underline; } +} +code span.al { color: #ff0000; font-weight: bold; } /* Alert */ +code span.an { color: #60a0b0; font-weight: bold; font-style: italic; } /* Annotation */ +code span.at { color: #7d9029; } /* Attribute */ +code span.bn { color: #40a070; } /* BaseN */ +code span.bu { } /* BuiltIn */ +code span.cf { color: #007020; font-weight: bold; } /* ControlFlow */ +code span.ch { color: #4070a0; } /* Char */ +code span.cn { color: #880000; } /* Constant */ +code span.co { color: #60a0b0; font-style: italic; } /* Comment */ +code span.cv { color: #60a0b0; font-weight: bold; font-style: italic; } /* CommentVar */ +code span.do { color: #ba2121; font-style: italic; } /* Documentation */ +code span.dt { color: #902000; } /* DataType */ +code span.dv { color: #40a070; } /* DecVal */ +code span.er { color: #ff0000; font-weight: bold; } /* Error */ +code span.ex { } /* Extension */ +code span.fl { color: #40a070; } /* Float */ +code span.fu { color: #06287e; } /* Function */ +code span.im { } /* Import */ +code span.in { color: #60a0b0; font-weight: bold; font-style: italic; } /* Information */ +code span.kw { color: #007020; font-weight: bold; } /* Keyword */ +code span.op { color: #666666; } /* Operator */ +code span.ot { color: #007020; } /* Other */ +code span.pp { color: #bc7a00; } /* Preprocessor */ +code span.sc { color: #4070a0; } /* SpecialChar */ +code span.ss { color: #bb6688; } /* SpecialString */ +code span.st { color: #4070a0; } /* String */ +code span.va { color: #19177c; } /* Variable */ +code span.vs { color: #4070a0; } /* VerbatimString */ +code span.wa { color: #60a0b0; font-weight: bold; font-style: italic; } /* Warning */ +div.csl-bib-body { } +div.csl-entry { + clear: both; +} +.hanging div.csl-entry { + margin-left:2em; + text-indent:-2em; +} +div.csl-left-margin { + min-width:2em; + float:left; +} +div.csl-right-inline { + margin-left:2em; + padding-left:1em; +} +div.csl-indent { + margin-left: 2em; +} +</style> + + +<script src="site_libs/quarto-nav/quarto-nav.js"></script> +<script src="site_libs/quarto-nav/headroom.min.js"></script> +<script src="site_libs/clipboard/clipboard.min.js"></script> +<script src="site_libs/quarto-search/autocomplete.umd.js"></script> +<script src="site_libs/quarto-search/fuse.min.js"></script> +<script src="site_libs/quarto-search/quarto-search.js"></script> +<meta name="quarto:offset" content="./"> +<link href="./references.html" rel="next"> +<link href="./03-vector_data.html" rel="prev"> +<script src="site_libs/quarto-html/quarto.js"></script> +<script src="site_libs/quarto-html/popper.min.js"></script> +<script src="site_libs/quarto-html/tippy.umd.min.js"></script> +<script src="site_libs/quarto-html/anchor.min.js"></script> +<link href="site_libs/quarto-html/tippy.css" rel="stylesheet"> +<link href="site_libs/quarto-html/quarto-syntax-highlighting.css" rel="stylesheet" id="quarto-text-highlighting-styles"> +<script src="site_libs/bootstrap/bootstrap.min.js"></script> +<link href="site_libs/bootstrap/bootstrap-icons.css" rel="stylesheet"> +<link href="site_libs/bootstrap/bootstrap.min.css" rel="stylesheet"> +<script id="quarto-search-options" type="application/json">{ + "location": "sidebar", + "copy-button": false, + "collapse-after": 3, + "panel-placement": "start", + "type": "textbox", + "limit": 20, + "language": { + "search-no-results-text": "No results", + "search-matching-documents-text": "matching documents", + "search-copy-link-title": "Copy link to search", + "search-hide-matches-text": "Hide additional matches", + "search-more-match-text": "more match in this document", + "search-more-matches-text": "more matches in this document", + "search-clear-button-title": "Clear", + "search-detached-cancel-button-title": "Cancel", + "search-submit-button-title": "Submit" + } +}</script> + + +<link rel="stylesheet" href="styles.css"> +</head> + +<body class="nav-sidebar floating"> + +<div id="quarto-search-results"></div> + <header id="quarto-header" class="headroom fixed-top"> + <nav class="quarto-secondary-nav" data-bs-toggle="collapse" data-bs-target="#quarto-sidebar" aria-controls="quarto-sidebar" aria-expanded="false" aria-label="Toggle sidebar navigation" onclick="if (window.quartoToggleHeadroom) { window.quartoToggleHeadroom(); }"> + <div class="container-fluid d-flex justify-content-between"> + <h1 class="quarto-secondary-nav-title"><span class="chapter-number">4</span> <span class="chapter-title">Mapping With R</span></h1> + <button type="button" class="quarto-btn-toggle btn" aria-label="Show secondary navigation"> + <i class="bi bi-chevron-right"></i> + </button> + </div> + </nav> +</header> +<!-- content --> +<div id="quarto-content" class="quarto-container page-columns page-rows-contents page-layout-article"> +<!-- sidebar --> + <nav id="quarto-sidebar" class="sidebar collapse sidebar-navigation floating overflow-auto"> + <div class="pt-lg-2 mt-2 text-left sidebar-header"> + <div class="sidebar-title mb-0 py-0"> + <a href="./">Mapping and spatial analyses in R for One Health studies</a> + <div class="sidebar-tools-main"> + <a href="https://forge.ird.fr/espace-dev/personnels/longour/rspatial-for-onehealth" title="Source Code" class="sidebar-tool px-1"><i class="bi bi-git"></i></a> +</div> + </div> + </div> + <div class="mt-2 flex-shrink-0 align-items-center"> + <div class="sidebar-search"> + <div id="quarto-search" class="" title="Search"></div> + </div> + </div> + <div class="sidebar-menu-container"> + <ul class="list-unstyled mt-1"> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./index.html" class="sidebar-item-text sidebar-link">Preface</a> + </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./01-introduction.html" class="sidebar-item-text sidebar-link"><span class="chapter-number">1</span> <span class="chapter-title">Introduction</span></a> + </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./02-data_acquisition.html" class="sidebar-item-text sidebar-link"><span class="chapter-number">2</span> <span class="chapter-title">Data Acquisition</span></a> + </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./03-vector_data.html" class="sidebar-item-text sidebar-link"><span class="chapter-number">3</span> <span class="chapter-title">Vector Data</span></a> + </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./05-mapping_with_r.html" class="sidebar-item-text sidebar-link active"><span class="chapter-number">4</span> <span class="chapter-title">Mapping With R</span></a> + </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./references.html" class="sidebar-item-text sidebar-link">References</a> + </div> +</li> + </ul> + </div> +</nav> +<!-- margin-sidebar --> + <div id="quarto-margin-sidebar" class="sidebar margin-sidebar"> + <nav id="TOC" role="doc-toc"> + <h2 id="toc-title">Table of contents</h2> + + <ul> + <li><a href="#types-of-maps" id="toc-types-of-maps" class="nav-link active" data-scroll-target="#types-of-maps"> <span class="header-section-number">4.1</span> Types of maps</a> + <ul class="collapse"> + <li><a href="#example-data" id="toc-example-data" class="nav-link" data-scroll-target="#example-data"> <span class="header-section-number">4.1.1</span> Example data</a></li> + <li><a href="#displaying-a-background-map" id="toc-displaying-a-background-map" class="nav-link" data-scroll-target="#displaying-a-background-map"> <span class="header-section-number">4.1.2</span> Displaying a background map</a></li> + <li><a href="#proportional-symbol-map" id="toc-proportional-symbol-map" class="nav-link" data-scroll-target="#proportional-symbol-map"> <span class="header-section-number">4.1.3</span> Proportional symbol map</a></li> + <li><a href="#choropleth-map" id="toc-choropleth-map" class="nav-link" data-scroll-target="#choropleth-map"> <span class="header-section-number">4.1.4</span> Choropleth map</a></li> + <li><a href="#typology-map" id="toc-typology-map" class="nav-link" data-scroll-target="#typology-map"> <span class="header-section-number">4.1.5</span> Typology map</a></li> + <li><a href="#map-of-stocks-and-ratios" id="toc-map-of-stocks-and-ratios" class="nav-link" data-scroll-target="#map-of-stocks-and-ratios"> <span class="header-section-number">4.1.6</span> Map of stocks and ratios</a></li> + <li><a href="#map-of-stocks-and-categories" id="toc-map-of-stocks-and-categories" class="nav-link" data-scroll-target="#map-of-stocks-and-categories"> <span class="header-section-number">4.1.7</span> Map of stocks and categories</a></li> + </ul></li> + <li><a href="#layout" id="toc-layout" class="nav-link" data-scroll-target="#layout"> <span class="header-section-number">4.2</span> Layout</a> + <ul class="collapse"> + <li><a href="#example-data-1" id="toc-example-data-1" class="nav-link" data-scroll-target="#example-data-1"> <span class="header-section-number">4.2.1</span> Example data</a></li> + <li><a href="#themes" id="toc-themes" class="nav-link" data-scroll-target="#themes"> <span class="header-section-number">4.2.2</span> Themes</a></li> + <li><a href="#titles" id="toc-titles" class="nav-link" data-scroll-target="#titles"> <span class="header-section-number">4.2.3</span> Titles</a></li> + <li><a href="#arrow-orientation" id="toc-arrow-orientation" class="nav-link" data-scroll-target="#arrow-orientation"> <span class="header-section-number">4.2.4</span> Arrow orientation</a></li> + <li><a href="#scale" id="toc-scale" class="nav-link" data-scroll-target="#scale"> <span class="header-section-number">4.2.5</span> Scale</a></li> + <li><a href="#credits" id="toc-credits" class="nav-link" data-scroll-target="#credits"> <span class="header-section-number">4.2.6</span> Credits</a></li> + <li><a href="#complete-dressing" id="toc-complete-dressing" class="nav-link" data-scroll-target="#complete-dressing"> <span class="header-section-number">4.2.7</span> Complete dressing</a></li> + <li><a href="#annotations" id="toc-annotations" class="nav-link" data-scroll-target="#annotations"> <span class="header-section-number">4.2.8</span> Annotations</a></li> + <li><a href="#legends" id="toc-legends" class="nav-link" data-scroll-target="#legends"> <span class="header-section-number">4.2.9</span> Legends</a></li> + <li><a href="#labels" id="toc-labels" class="nav-link" data-scroll-target="#labels"> <span class="header-section-number">4.2.10</span> Labels</a></li> + <li><a href="#center-the-map-on-a-region" id="toc-center-the-map-on-a-region" class="nav-link" data-scroll-target="#center-the-map-on-a-region"> <span class="header-section-number">4.2.11</span> Center the map on a region</a></li> + <li><a href="#displaying-several-maps-on-the-sam-figure" id="toc-displaying-several-maps-on-the-sam-figure" class="nav-link" data-scroll-target="#displaying-several-maps-on-the-sam-figure"> <span class="header-section-number">4.2.12</span> Displaying several maps on the sam figure</a></li> + <li><a href="#exporting-maps" id="toc-exporting-maps" class="nav-link" data-scroll-target="#exporting-maps"> <span class="header-section-number">4.2.13</span> Exporting maps</a></li> + <li><a href="#adding-an-image-to-a-map" id="toc-adding-an-image-to-a-map" class="nav-link" data-scroll-target="#adding-an-image-to-a-map"> <span class="header-section-number">4.2.14</span> Adding an image to a map</a></li> + <li><a href="#place-an-item-precisely-on-the-map" id="toc-place-an-item-precisely-on-the-map" class="nav-link" data-scroll-target="#place-an-item-precisely-on-the-map"> <span class="header-section-number">4.2.15</span> Place an item precisely on the map</a></li> + <li><a href="#add-shading-to-a-layer" id="toc-add-shading-to-a-layer" class="nav-link" data-scroll-target="#add-shading-to-a-layer"> <span class="header-section-number">4.2.16</span> Add shading to a layer</a></li> + <li><a href="#creating-boxes" id="toc-creating-boxes" class="nav-link" data-scroll-target="#creating-boxes"> <span class="header-section-number">4.2.17</span> Creating Boxes</a></li> + </ul></li> + <li><a href="#d-maps" id="toc-d-maps" class="nav-link" data-scroll-target="#d-maps"> <span class="header-section-number">4.3</span> 3D maps</a> + <ul class="collapse"> + <li><a href="#linemap" id="toc-linemap" class="nav-link" data-scroll-target="#linemap"> <span class="header-section-number">4.3.1</span> linemap</a></li> + <li><a href="#relief-tanaka" id="toc-relief-tanaka" class="nav-link" data-scroll-target="#relief-tanaka"> <span class="header-section-number">4.3.2</span> Relief Tanaka</a></li> + </ul></li> + <li><a href="#cartographic-transformation" id="toc-cartographic-transformation" class="nav-link" data-scroll-target="#cartographic-transformation"> <span class="header-section-number">4.4</span> Cartographic Transformation</a> + <ul class="collapse"> + <li><a href="#dorlings-cartograms" id="toc-dorlings-cartograms" class="nav-link" data-scroll-target="#dorlings-cartograms"> <span class="header-section-number">4.4.1</span> Dorling’s cartograms</a></li> + <li><a href="#non-continuous-cartograms" id="toc-non-continuous-cartograms" class="nav-link" data-scroll-target="#non-continuous-cartograms"> <span class="header-section-number">4.4.2</span> Non-continuous cartograms</a></li> + <li><a href="#continuous-cartograms" id="toc-continuous-cartograms" class="nav-link" data-scroll-target="#continuous-cartograms"> <span class="header-section-number">4.4.3</span> Continuous cartograms</a></li> + <li><a href="#stengths-and-weaknessses-of-cartograms" id="toc-stengths-and-weaknessses-of-cartograms" class="nav-link" data-scroll-target="#stengths-and-weaknessses-of-cartograms"> <span class="header-section-number">4.4.4</span> Stengths and weaknessses of cartograms</a></li> + </ul></li> + </ul> +</nav> + </div> +<!-- main --> +<main class="content" id="quarto-document-content"> + +<header id="title-block-header" class="quarto-title-block default"> +<div class="quarto-title"> +<h1 class="title d-none d-lg-block"><span class="chapter-number">4</span> <span class="chapter-title">Mapping With R</span></h1> +</div> + + + +<div class="quarto-title-meta"> + + + + </div> + + +</header> + +<section id="types-of-maps" class="level2" data-number="4.1"> +<h2 data-number="4.1" class="anchored" data-anchor-id="types-of-maps"><span class="header-section-number">4.1</span> Types of maps</h2> +<p>The fonction <code>mf_map()</code> is the central function of the package <code>mapsf</code> <span class="citation" data-cites="mapsf">(<a href="references.html#ref-mapsf" role="doc-biblioref">Giraud 2022a</a>)</span>. It makes it possible to carry out most of the usual representations in cartography. These main arguments are:</p> +<ul> +<li><code>x</code>, an sf object ;</li> +<li><code>var</code>, the name of variable to present ;</li> +<li><code>type</code>, the type of presentation.</li> +</ul> +<section id="example-data" class="level3" data-number="4.1.1"> +<h3 data-number="4.1.1" class="anchored" data-anchor-id="example-data"><span class="header-section-number">4.1.1</span> Example data</h3> +<p>The following lines import the spatial information layers located in the <a href="https://www.geopackage.org/">geopackage</a> <strong>cambodia.gpkg</strong> file.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb1"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb1-1"><a href="#cb1-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(sf)</span> +<span id="cb1-2"><a href="#cb1-2" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb1-3"><a href="#cb1-3" aria-hidden="true" tabindex="-1"></a><span class="co">#Import Cambodia country border</span></span> +<span id="cb1-4"><a href="#cb1-4" aria-hidden="true" tabindex="-1"></a>country <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"country"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<span id="cb1-5"><a href="#cb1-5" aria-hidden="true" tabindex="-1"></a><span class="co">#Import provincial administrative border of Cambodia</span></span> +<span id="cb1-6"><a href="#cb1-6" aria-hidden="true" tabindex="-1"></a>education <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"education"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<span id="cb1-7"><a href="#cb1-7" aria-hidden="true" tabindex="-1"></a><span class="co">#Import district administrative border of Cambodia</span></span> +<span id="cb1-8"><a href="#cb1-8" aria-hidden="true" tabindex="-1"></a>district <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"district"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<span id="cb1-9"><a href="#cb1-9" aria-hidden="true" tabindex="-1"></a><span class="co">#Import roads data in Cambodia</span></span> +<span id="cb1-10"><a href="#cb1-10" aria-hidden="true" tabindex="-1"></a>road <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"road"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<span id="cb1-11"><a href="#cb1-11" aria-hidden="true" tabindex="-1"></a><span class="co">#Import health center data in Cambodia</span></span> +<span id="cb1-12"><a href="#cb1-12" aria-hidden="true" tabindex="-1"></a>hospital <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"hospital"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +</div> +</section> +<section id="displaying-a-background-map" class="level3" data-number="4.1.2"> +<h3 data-number="4.1.2" class="anchored" data-anchor-id="displaying-a-background-map"><span class="header-section-number">4.1.2</span> Displaying a background map</h3> +<p>Without using types specification, the function <code>mf_map()</code> simply display the background map.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb2"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb2-1"><a href="#cb2-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(mapsf)</span> +<span id="cb2-2"><a href="#cb2-2" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb2-3"><a href="#cb2-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> district, <span class="at">border =</span> <span class="st">"white"</span>)</span> +<span id="cb2-4"><a href="#cb2-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> country,<span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">col =</span> <span class="cn">NA</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb2-5"><a href="#cb2-5" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> road, <span class="at">lwd =</span> .<span class="dv">5</span>, <span class="at">col =</span> <span class="st">"ivory4"</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb2-6"><a href="#cb2-6" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> hospital, <span class="at">pch =</span> <span class="dv">20</span>, <span class="at">cex =</span> <span class="dv">1</span>, <span class="at">col =</span> <span class="st">"#FE9A2E"</span>, <span class="at">add =</span> <span class="cn">TRUE</span>) </span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/mf_base-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="proportional-symbol-map" class="level3" data-number="4.1.3"> +<h3 data-number="4.1.3" class="anchored" data-anchor-id="proportional-symbol-map"><span class="header-section-number">4.1.3</span> Proportional symbol map</h3> +<p>Proportional symbol maps are used to represent inventory variables (absolute quantitative variables, sum and average make sense). The function <code>mf_map(..., type = "prop")</code> proposes this representation.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb3"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb3-1"><a href="#cb3-1" aria-hidden="true" tabindex="-1"></a><span class="co">#District</span></span> +<span id="cb3-2"><a href="#cb3-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> district) </span> +<span id="cb3-3"><a href="#cb3-3" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb3-4"><a href="#cb3-4" aria-hidden="true" tabindex="-1"></a><span class="co"># Proportional symbol </span></span> +<span id="cb3-5"><a href="#cb3-5" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb3-6"><a href="#cb3-6" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> district, </span> +<span id="cb3-7"><a href="#cb3-7" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"T_POP"</span>,</span> +<span id="cb3-8"><a href="#cb3-8" aria-hidden="true" tabindex="-1"></a> <span class="at">val_max =</span> <span class="dv">700000</span>,</span> +<span id="cb3-9"><a href="#cb3-9" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"prop"</span>,</span> +<span id="cb3-10"><a href="#cb3-10" aria-hidden="true" tabindex="-1"></a> <span class="at">col =</span> <span class="st">"#148F77"</span>, </span> +<span id="cb3-11"><a href="#cb3-11" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="st">"Population 2019"</span></span> +<span id="cb3-12"><a href="#cb3-12" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb3-13"><a href="#cb3-13" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb3-14"><a href="#cb3-14" aria-hidden="true" tabindex="-1"></a><span class="co"># Title</span></span> +<span id="cb3-15"><a href="#cb3-15" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Distribution of population in provincial level"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/proportional_symbols-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<section id="compare-multiple-map" class="level4" data-number="4.1.3.1"> +<h4 data-number="4.1.3.1" class="anchored" data-anchor-id="compare-multiple-map"><span class="header-section-number">4.1.3.1</span> Compare multiple map</h4> +<p>It is possible to fix the dimensions of the largest symbol corresponding to a certain value with the arguments <code>inches</code> and <code>val_max</code>. We can use construct maps with comparable proportional symbols.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb4"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb4-1"><a href="#cb4-1" aria-hidden="true" tabindex="-1"></a><span class="fu">par</span>(<span class="at">mfrow =</span> <span class="fu">c</span>(<span class="dv">1</span>,<span class="dv">2</span>)) <span class="co">#Displaying two maps facing each other</span></span> +<span id="cb4-2"><a href="#cb4-2" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb4-3"><a href="#cb4-3" aria-hidden="true" tabindex="-1"></a><span class="co">#district</span></span> +<span id="cb4-4"><a href="#cb4-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> district, <span class="at">border =</span> <span class="st">"grey90"</span>, <span class="at">lwd =</span> .<span class="dv">5</span>) </span> +<span id="cb4-5"><a href="#cb4-5" aria-hidden="true" tabindex="-1"></a><span class="co"># Add male Population</span></span> +<span id="cb4-6"><a href="#cb4-6" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb4-7"><a href="#cb4-7" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> district, </span> +<span id="cb4-8"><a href="#cb4-8" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"Male"</span>, </span> +<span id="cb4-9"><a href="#cb4-9" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"prop"</span>,</span> +<span id="cb4-10"><a href="#cb4-10" aria-hidden="true" tabindex="-1"></a> <span class="at">col =</span> <span class="st">"#1F618D"</span>,</span> +<span id="cb4-11"><a href="#cb4-11" aria-hidden="true" tabindex="-1"></a> <span class="at">inches =</span> <span class="fl">0.2</span>, </span> +<span id="cb4-12"><a href="#cb4-12" aria-hidden="true" tabindex="-1"></a> <span class="at">val_max =</span> <span class="dv">300000</span>, </span> +<span id="cb4-13"><a href="#cb4-13" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="st">"Male"</span>, </span> +<span id="cb4-14"><a href="#cb4-14" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_val_cex =</span> <span class="fl">0.5</span>,</span> +<span id="cb4-15"><a href="#cb4-15" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb4-16"><a href="#cb4-16" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Male Population by Distict"</span>) <span class="co">#Adding map title</span></span> +<span id="cb4-17"><a href="#cb4-17" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb4-18"><a href="#cb4-18" aria-hidden="true" tabindex="-1"></a><span class="co">#district</span></span> +<span id="cb4-19"><a href="#cb4-19" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> district, <span class="at">border =</span> <span class="st">"grey90"</span>, <span class="at">lwd =</span> .<span class="dv">5</span>) </span> +<span id="cb4-20"><a href="#cb4-20" aria-hidden="true" tabindex="-1"></a><span class="co"># Add female Population</span></span> +<span id="cb4-21"><a href="#cb4-21" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb4-22"><a href="#cb4-22" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> district, </span> +<span id="cb4-23"><a href="#cb4-23" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"Female"</span>, </span> +<span id="cb4-24"><a href="#cb4-24" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"prop"</span>,</span> +<span id="cb4-25"><a href="#cb4-25" aria-hidden="true" tabindex="-1"></a> <span class="at">col =</span> <span class="st">"#E74C3C"</span>,</span> +<span id="cb4-26"><a href="#cb4-26" aria-hidden="true" tabindex="-1"></a> <span class="at">inches =</span> <span class="fl">0.2</span>, </span> +<span id="cb4-27"><a href="#cb4-27" aria-hidden="true" tabindex="-1"></a> <span class="at">val_max =</span> <span class="dv">300000</span>, </span> +<span id="cb4-28"><a href="#cb4-28" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span><span class="st">"Female"</span>, </span> +<span id="cb4-29"><a href="#cb4-29" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_val_cex =</span> <span class="fl">0.5</span></span> +<span id="cb4-30"><a href="#cb4-30" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb4-31"><a href="#cb4-31" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Female Population by Distict"</span>) <span class="co">#Adding map title</span></span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/proportional_symbols_comp-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<p>Here we have displayed two maps facing each other, see the point <a href="#afficher-plusieurs-cartes-sur-la-même-figure">Displaying several maps on the same figure</a> for more details.</p> +</section> +</section> +<section id="choropleth-map" class="level3" data-number="4.1.4"> +<h3 data-number="4.1.4" class="anchored" data-anchor-id="choropleth-map"><span class="header-section-number">4.1.4</span> Choropleth map</h3> +<p>Choropleth maps are used to represent ratio variables (relative quantitative variables, mean has meaning, sum has no meaning).</p> +<p>For this type of representation, you must first:</p> +<ul> +<li>choose a discretization method to transform a continuous statistical series into classes defined by intervals,</li> +<li>choose a number of classes,</li> +<li>choose a color palette.</li> +</ul> +<p>The function mf_map(…, type = “choroâ€)makes it possible to create choroplete maps. The arguments nbreaks and breaks are used to parameterize the discretizations, and the function <code>mf_get_breaks()</code> makes it possible to work on the discretizations outside the function <code>mf_map()</code>. Similarly, the argument palis used to fill in a color palette, but several functions can be used to set the palettes apart from the (<code>mf_get_pal</code>…) function.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb5"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb5-1"><a href="#cb5-1" aria-hidden="true" tabindex="-1"></a><span class="co"># Population density (inhabitants/km2) using the sf::st_area() function</span></span> +<span id="cb5-2"><a href="#cb5-2" aria-hidden="true" tabindex="-1"></a>district<span class="sc">$</span>DENS <span class="ot"><-</span> <span class="fl">1e6</span> <span class="sc">*</span> district<span class="sc">$</span>T_POP <span class="sc">/</span> <span class="fu">as.numeric</span>(<span class="fu">st_area</span>(district)) <span class="co">#Calculate population density </span></span> +<span id="cb5-3"><a href="#cb5-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb5-4"><a href="#cb5-4" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> district,</span> +<span id="cb5-5"><a href="#cb5-5" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"DENS"</span>,</span> +<span id="cb5-6"><a href="#cb5-6" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"choro"</span>,</span> +<span id="cb5-7"><a href="#cb5-7" aria-hidden="true" tabindex="-1"></a> <span class="at">breaks =</span> <span class="st">"quantile"</span>,</span> +<span id="cb5-8"><a href="#cb5-8" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="st">"BuGn"</span>,</span> +<span id="cb5-9"><a href="#cb5-9" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> <span class="dv">1</span>,</span> +<span id="cb5-10"><a href="#cb5-10" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="st">"Distribution of population</span><span class="sc">\n</span><span class="st">(inhabitants per km2)"</span>, </span> +<span id="cb5-11"><a href="#cb5-11" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_val_rnd =</span> <span class="dv">0</span></span> +<span id="cb5-12"><a href="#cb5-12" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb5-13"><a href="#cb5-13" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Distribution of the population in (2019)"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/choro-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<section id="discretisation" class="level4" data-number="4.1.4.1"> +<h4 data-number="4.1.4.1" class="anchored" data-anchor-id="discretisation"><span class="header-section-number">4.1.4.1</span> Discretisation</h4> +<p>The fonction <code>mf_get_breaks()</code> provides the methods of discretization of classic variables: quantiles, average/standard deviation, equal amplitudes, nested averages, Fisher-Jenks, geometric, etc.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb6"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb6-1"><a href="#cb6-1" aria-hidden="true" tabindex="-1"></a>education<span class="sc">$</span>enrol_g_pct <span class="ot">=</span> <span class="dv">100</span> <span class="sc">*</span> education<span class="sc">$</span>enrol_girl<span class="sc">/</span>education<span class="sc">$</span>t_enrol <span class="co">#Calculate percentage of enrolled girl student</span></span> +<span id="cb6-2"><a href="#cb6-2" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb6-3"><a href="#cb6-3" aria-hidden="true" tabindex="-1"></a>d1 <span class="ot">=</span> <span class="fu">mf_get_breaks</span>(education<span class="sc">$</span>enrol_g_pct, <span class="at">nbreaks =</span> <span class="dv">6</span>, <span class="at">breaks =</span> <span class="st">"equal"</span>, <span class="at">freq =</span> <span class="cn">TRUE</span>)</span> +<span id="cb6-4"><a href="#cb6-4" aria-hidden="true" tabindex="-1"></a>d2 <span class="ot">=</span> <span class="fu">mf_get_breaks</span>(education<span class="sc">$</span>enrol_g_pct, <span class="at">nbreaks =</span> <span class="dv">6</span>, <span class="at">breaks =</span> <span class="st">"quantile"</span>)</span> +<span id="cb6-5"><a href="#cb6-5" aria-hidden="true" tabindex="-1"></a>d3 <span class="ot">=</span> <span class="fu">mf_get_breaks</span>(education<span class="sc">$</span>enrol_g_pct, <span class="at">nbreaks =</span> <span class="dv">6</span>, <span class="at">breaks =</span> <span class="st">"geom"</span>)</span> +<span id="cb6-6"><a href="#cb6-6" aria-hidden="true" tabindex="-1"></a>d4 <span class="ot">=</span> <span class="fu">mf_get_breaks</span>(education<span class="sc">$</span>enrol_g_pct, <span class="at">breaks =</span> <span class="st">"msd"</span>, <span class="at">central =</span> <span class="cn">FALSE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +</div> +<div class="cell"> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/discr3-1.png" class="img-fluid" width="768"></p> +</div> +</div> +</section> +<section id="palettes" class="level4" data-number="4.1.4.2"> +<h4 data-number="4.1.4.2" class="anchored" data-anchor-id="palettes"><span class="header-section-number">4.1.4.2</span> Color palettes</h4> +<p>The argument <code>pal</code> de <code>mf_map()</code> is dedicated to choosing a color palette. The palettes provided by the function <code>hcl.colors()</code> can be used directly.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb7"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb7-1"><a href="#cb7-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> education, <span class="at">var =</span> <span class="st">"enrol_g_pct"</span>, <span class="at">type =</span> <span class="st">"choro"</span>,</span> +<span id="cb7-2"><a href="#cb7-2" aria-hidden="true" tabindex="-1"></a> <span class="at">breaks =</span> d3, <span class="at">pal =</span> <span class="st">"Reds 3"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/pal1-1.png" class="img-fluid" width="576"></p> +</div> +</div> +<div class="quarto-figure quarto-figure-center"> +<figure class="figure"> +<p><img src="img/swatch-plot-1.svg" class="img-fluid figure-img" width="600"></p> +</figure> +</div> +<p>The fonction <code>mf_get_pal()</code> allows you to build a color palette. This function is especially useful for creating balanced asymmetrical diverging palettes.</p> +<div class="cell" data-nm="true"> +<div class="sourceCode cell-code" id="cb8"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb8-1"><a href="#cb8-1" aria-hidden="true" tabindex="-1"></a>mypal <span class="ot"><-</span> <span class="fu">mf_get_pal</span>(<span class="at">n =</span> <span class="fu">c</span>(<span class="dv">4</span>,<span class="dv">6</span>), <span class="at">palette =</span> <span class="fu">c</span>(<span class="st">"Burg"</span>, <span class="st">"Teal"</span>))</span> +<span id="cb8-2"><a href="#cb8-2" aria-hidden="true" tabindex="-1"></a><span class="fu">image</span>(<span class="dv">1</span><span class="sc">:</span><span class="dv">10</span>, <span class="dv">1</span>, <span class="fu">as.matrix</span>(<span class="dv">1</span><span class="sc">:</span><span class="dv">10</span>), <span class="at">col=</span>mypal, <span class="at">xlab =</span> <span class="st">""</span>, <span class="at">ylab =</span> <span class="st">""</span>, <span class="at">xaxt =</span> <span class="st">"n"</span>,</span> +<span id="cb8-3"><a href="#cb8-3" aria-hidden="true" tabindex="-1"></a> <span class="at">yaxt =</span> <span class="st">"n"</span>,<span class="at">bty =</span> <span class="st">"n"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/pal2-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="for-a-point-layer" class="level4" data-number="4.1.4.3"> +<h4 data-number="4.1.4.3" class="anchored" data-anchor-id="for-a-point-layer"><span class="header-section-number">4.1.4.3</span> For a point layer</h4> +<p>It is possible to use this mode of presentation in specific implementation also.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb9"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb9-1"><a href="#cb9-1" aria-hidden="true" tabindex="-1"></a>dist_c <span class="ot"><-</span> <span class="fu">st_centroid</span>(district)</span> +<span id="cb9-2"><a href="#cb9-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb9-3"><a href="#cb9-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb9-4"><a href="#cb9-4" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> dist_c,</span> +<span id="cb9-5"><a href="#cb9-5" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"DENS"</span>,</span> +<span id="cb9-6"><a href="#cb9-6" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"choro"</span>,</span> +<span id="cb9-7"><a href="#cb9-7" aria-hidden="true" tabindex="-1"></a> <span class="at">breaks =</span> <span class="st">"quantile"</span>,</span> +<span id="cb9-8"><a href="#cb9-8" aria-hidden="true" tabindex="-1"></a> <span class="at">nbreaks =</span> <span class="dv">5</span>,</span> +<span id="cb9-9"><a href="#cb9-9" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="st">"PuRd"</span>,</span> +<span id="cb9-10"><a href="#cb9-10" aria-hidden="true" tabindex="-1"></a> <span class="at">pch =</span> <span class="dv">23</span>,</span> +<span id="cb9-11"><a href="#cb9-11" aria-hidden="true" tabindex="-1"></a> <span class="at">cex =</span> <span class="fl">1.5</span>,</span> +<span id="cb9-12"><a href="#cb9-12" aria-hidden="true" tabindex="-1"></a> <span class="at">border =</span> <span class="st">"white"</span>,</span> +<span id="cb9-13"><a href="#cb9-13" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> .<span class="dv">7</span>,</span> +<span id="cb9-14"><a href="#cb9-14" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_pos =</span> <span class="st">"topleft"</span>,</span> +<span id="cb9-15"><a href="#cb9-15" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="st">"Distribution of population</span><span class="sc">\n</span><span class="st">(inhabitants per km2)"</span>, </span> +<span id="cb9-16"><a href="#cb9-16" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_val_rnd =</span> <span class="dv">0</span>, </span> +<span id="cb9-17"><a href="#cb9-17" aria-hidden="true" tabindex="-1"></a> <span class="at">add =</span> <span class="cn">TRUE</span></span> +<span id="cb9-18"><a href="#cb9-18" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb9-19"><a href="#cb9-19" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Distribution of population in (2019)"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/choropt-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +</section> +<section id="typology-map" class="level3" data-number="4.1.5"> +<h3 data-number="4.1.5" class="anchored" data-anchor-id="typology-map"><span class="header-section-number">4.1.5</span> Typology map</h3> +<p>Typology maps are used to represent qualitative variables. The function <code>mf_map(..., type = "typo")</code> proposes this representation.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb10"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb10-1"><a href="#cb10-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb10-2"><a href="#cb10-2" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> district,</span> +<span id="cb10-3"><a href="#cb10-3" aria-hidden="true" tabindex="-1"></a> <span class="at">var=</span><span class="st">"Status"</span>,</span> +<span id="cb10-4"><a href="#cb10-4" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"typo"</span>,</span> +<span id="cb10-5"><a href="#cb10-5" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="fu">c</span>(<span class="st">'#E8F9FD'</span>,<span class="st">'#FF7396'</span>,<span class="st">'#E4BAD4'</span>,<span class="st">'#FFE3FE'</span>),</span> +<span id="cb10-6"><a href="#cb10-6" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> .<span class="dv">7</span>,</span> +<span id="cb10-7"><a href="#cb10-7" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="st">""</span></span> +<span id="cb10-8"><a href="#cb10-8" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb10-9"><a href="#cb10-9" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Administrative status by size of area"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/typo_simple-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<section id="ordering-value-in-the-legend" class="level4" data-number="4.1.5.1"> +<h4 data-number="4.1.5.1" class="anchored" data-anchor-id="ordering-value-in-the-legend"><span class="header-section-number">4.1.5.1</span> Ordering value in the legend</h4> +<p>The argument <code>val_order</code> is used to order the categories in the</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb11"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb11-1"><a href="#cb11-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb11-2"><a href="#cb11-2" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> district,</span> +<span id="cb11-3"><a href="#cb11-3" aria-hidden="true" tabindex="-1"></a> <span class="at">var=</span><span class="st">"Status"</span>,</span> +<span id="cb11-4"><a href="#cb11-4" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"typo"</span>,</span> +<span id="cb11-5"><a href="#cb11-5" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="fu">c</span>(<span class="st">'#E8F9FD'</span>,<span class="st">'#FF7396'</span>,<span class="st">'#E4BAD4'</span>,<span class="st">'#FFE3FE'</span>),</span> +<span id="cb11-6"><a href="#cb11-6" aria-hidden="true" tabindex="-1"></a> <span class="at">val_order =</span> <span class="fu">c</span>(<span class="st">"1st largest district"</span>, <span class="st">"2nd largest district"</span>, <span class="st">"3rd largest district"</span>,<span class="st">"<4500km2"</span>),</span> +<span id="cb11-7"><a href="#cb11-7" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> .<span class="dv">7</span>,</span> +<span id="cb11-8"><a href="#cb11-8" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="st">""</span></span> +<span id="cb11-9"><a href="#cb11-9" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb11-10"><a href="#cb11-10" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Administrative status by size of area"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/typo_order-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="map-of-point" class="level4" data-number="4.1.5.2"> +<h4 data-number="4.1.5.2" class="anchored" data-anchor-id="map-of-point"><span class="header-section-number">4.1.5.2</span> Map of point</h4> +<p>When the implantation of the layer is punctual, symbols are used to carry the colors of the typology.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb12"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb12-1"><a href="#cb12-1" aria-hidden="true" tabindex="-1"></a><span class="co">#extract centroid point of the district</span></span> +<span id="cb12-2"><a href="#cb12-2" aria-hidden="true" tabindex="-1"></a>dist_ctr <span class="ot"><-</span> <span class="fu">st_centroid</span>(district[district<span class="sc">$</span>Status <span class="sc">!=</span> <span class="st">"<4500km2"</span>, ])</span> +<span id="cb12-3"><a href="#cb12-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb12-4"><a href="#cb12-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb12-5"><a href="#cb12-5" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> dist_ctr,</span> +<span id="cb12-6"><a href="#cb12-6" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"Status"</span>,</span> +<span id="cb12-7"><a href="#cb12-7" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"typo"</span>,</span> +<span id="cb12-8"><a href="#cb12-8" aria-hidden="true" tabindex="-1"></a> <span class="at">cex =</span> <span class="dv">2</span>,</span> +<span id="cb12-9"><a href="#cb12-9" aria-hidden="true" tabindex="-1"></a> <span class="at">pch =</span> <span class="dv">22</span>,</span> +<span id="cb12-10"><a href="#cb12-10" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="fu">c</span>(<span class="st">'#FF7396'</span>,<span class="st">'#E4BAD4'</span>,<span class="st">'#FFE3FE'</span>),</span> +<span id="cb12-11"><a href="#cb12-11" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="st">""</span>,</span> +<span id="cb12-12"><a href="#cb12-12" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_pos =</span> <span class="st">"bottomright"</span>,</span> +<span id="cb12-13"><a href="#cb12-13" aria-hidden="true" tabindex="-1"></a> <span class="at">add =</span> <span class="cn">TRUE</span></span> +<span id="cb12-14"><a href="#cb12-14" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb12-15"><a href="#cb12-15" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Administrative status by size of area"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/typo_point-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="map-of-lines" class="level4" data-number="4.1.5.3"> +<h4 data-number="4.1.5.3" class="anchored" data-anchor-id="map-of-lines"><span class="header-section-number">4.1.5.3</span> Map of lines</h4> +<div class="cell"> +<div class="sourceCode cell-code" id="cb13"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb13-1"><a href="#cb13-1" aria-hidden="true" tabindex="-1"></a><span class="co">#Selection of roads that intersect the city of Siem Reap</span></span> +<span id="cb13-2"><a href="#cb13-2" aria-hidden="true" tabindex="-1"></a>pp <span class="ot"><-</span> district[district<span class="sc">$</span>ADM1_EN <span class="sc">==</span> <span class="st">"Phnom Penh"</span>, ]</span> +<span id="cb13-3"><a href="#cb13-3" aria-hidden="true" tabindex="-1"></a>road_pp <span class="ot"><-</span> road[<span class="fu">st_intersects</span>(<span class="at">x =</span> road, <span class="at">y =</span> pp, <span class="at">sparse =</span> <span class="cn">FALSE</span>), ]</span> +<span id="cb13-4"><a href="#cb13-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(pp)</span> +<span id="cb13-5"><a href="#cb13-5" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb13-6"><a href="#cb13-6" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> road_pp,</span> +<span id="cb13-7"><a href="#cb13-7" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"fclass"</span>,</span> +<span id="cb13-8"><a href="#cb13-8" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"typo"</span>,</span> +<span id="cb13-9"><a href="#cb13-9" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> <span class="fl">1.2</span>,</span> +<span id="cb13-10"><a href="#cb13-10" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="fu">mf_get_pal</span>(<span class="at">n =</span> <span class="dv">6</span>, <span class="st">"Tropic"</span>),</span> +<span id="cb13-11"><a href="#cb13-11" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="st">"Types of road"</span>,</span> +<span id="cb13-12"><a href="#cb13-12" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_pos =</span> <span class="st">"topright"</span>,</span> +<span id="cb13-13"><a href="#cb13-13" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_frame =</span> T,</span> +<span id="cb13-14"><a href="#cb13-14" aria-hidden="true" tabindex="-1"></a> <span class="at">add =</span> <span class="cn">TRUE</span></span> +<span id="cb13-15"><a href="#cb13-15" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb13-16"><a href="#cb13-16" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Administrative status"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/unnamed-chunk-2-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +</section> +<section id="map-of-stocks-and-ratios" class="level3" data-number="4.1.6"> +<h3 data-number="4.1.6" class="anchored" data-anchor-id="map-of-stocks-and-ratios"><span class="header-section-number">4.1.6</span> Map of stocks and ratios</h3> +<p>The function <code>mf_map(..., var = c("var1", "var2"), type = "prop_choro")</code> represents proportional symbols whose areas are proportional to the values of one variable and whose color is based on the discretization of a second variable. The function uses the arguments of the functions <code>mf_map(..., type = "prop")</code> and <code>mf_map(..., type = "choro")</code>.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb14"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb14-1"><a href="#cb14-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> district)</span> +<span id="cb14-2"><a href="#cb14-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb14-3"><a href="#cb14-3" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> district,</span> +<span id="cb14-4"><a href="#cb14-4" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="fu">c</span>(<span class="st">"T_POP"</span>, <span class="st">"DENS"</span>),</span> +<span id="cb14-5"><a href="#cb14-5" aria-hidden="true" tabindex="-1"></a> <span class="at">val_max =</span> <span class="dv">500000</span>,</span> +<span id="cb14-6"><a href="#cb14-6" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"prop_choro"</span>,</span> +<span id="cb14-7"><a href="#cb14-7" aria-hidden="true" tabindex="-1"></a> <span class="at">border =</span> <span class="st">"grey60"</span>,</span> +<span id="cb14-8"><a href="#cb14-8" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> <span class="fl">0.5</span>,</span> +<span id="cb14-9"><a href="#cb14-9" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_pos =</span> <span class="fu">c</span>(<span class="st">"bottomright"</span>, <span class="st">"bottomleft"</span>),</span> +<span id="cb14-10"><a href="#cb14-10" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="fu">c</span>(<span class="st">"Population"</span>, <span class="st">"Density of</span><span class="sc">\n</span><span class="st"> population</span><span class="sc">\n</span><span class="st">(inhabitants per km2)"</span>),</span> +<span id="cb14-11"><a href="#cb14-11" aria-hidden="true" tabindex="-1"></a> <span class="at">breaks =</span> <span class="st">"q6"</span>,</span> +<span id="cb14-12"><a href="#cb14-12" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="st">"Blues 3"</span>,</span> +<span id="cb14-13"><a href="#cb14-13" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_val_rnd =</span> <span class="fu">c</span>(<span class="dv">0</span>,<span class="dv">1</span>))</span> +<span id="cb14-14"><a href="#cb14-14" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Population"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/choroprop-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="map-of-stocks-and-categories" class="level3" data-number="4.1.7"> +<h3 data-number="4.1.7" class="anchored" data-anchor-id="map-of-stocks-and-categories"><span class="header-section-number">4.1.7</span> Map of stocks and categories</h3> +<p>The function <code>mf_map(..., var = c("var1", "var2"), type = "prop_typo")</code> represents proportional symbols whose areas are proportional to the values of one variable and whose color is based on the discretization of a second variable. The function uses the arguments of the <code>mf_map(..., type = "prop")</code> and function <code>mf_map(..., type = "typo")</code>.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb15"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb15-1"><a href="#cb15-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(<span class="at">x =</span> district)</span> +<span id="cb15-2"><a href="#cb15-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(</span> +<span id="cb15-3"><a href="#cb15-3" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> district,</span> +<span id="cb15-4"><a href="#cb15-4" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="fu">c</span>(<span class="st">"Area.Km2."</span>, <span class="st">"Status"</span>),</span> +<span id="cb15-5"><a href="#cb15-5" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"prop_typo"</span>,</span> +<span id="cb15-6"><a href="#cb15-6" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="fu">c</span>(<span class="st">'#E8F9FD'</span>,<span class="st">'#FF7396'</span>,<span class="st">'#E4BAD4'</span>,<span class="st">'#FFE3FE'</span>),</span> +<span id="cb15-7"><a href="#cb15-7" aria-hidden="true" tabindex="-1"></a> <span class="at">val_order =</span> <span class="fu">c</span>(<span class="st">"<4500km2"</span>,<span class="st">"1st largest district"</span>, <span class="st">"2nd largest district"</span>, <span class="st">"3rd largest district"</span>),</span> +<span id="cb15-8"><a href="#cb15-8" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_pos =</span> <span class="fu">c</span>(<span class="st">"bottomleft"</span>,<span class="st">"topleft"</span>),</span> +<span id="cb15-9"><a href="#cb15-9" aria-hidden="true" tabindex="-1"></a> <span class="at">leg_title =</span> <span class="fu">c</span>(<span class="st">"Population</span><span class="sc">\n</span><span class="st">(2019)"</span>,</span> +<span id="cb15-10"><a href="#cb15-10" aria-hidden="true" tabindex="-1"></a> <span class="st">"Statut administratif"</span>),</span> +<span id="cb15-11"><a href="#cb15-11" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb15-12"><a href="#cb15-12" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Population"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/typoprop-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +</section> +<section id="layout" class="level2" data-number="4.2"> +<h2 data-number="4.2" class="anchored" data-anchor-id="layout"><span class="header-section-number">4.2</span> Layout</h2> +<p>To be finalized, a thematic map must contain certain additional elements such as: title, author, source, scale, orientation…</p> +<section id="example-data-1" class="level3" data-number="4.2.1"> +<h3 data-number="4.2.1" class="anchored" data-anchor-id="example-data-1"><span class="header-section-number">4.2.1</span> Example data</h3> +<p>The following lines import the spatial information layers located in the <a href="https://www.geopackage.org/">geopackage</a> <strong>lot46.gpkg</strong> file.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb16"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb16-1"><a href="#cb16-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(sf)</span> +<span id="cb16-2"><a href="#cb16-2" aria-hidden="true" tabindex="-1"></a>country <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"country"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="co">#Import Cambodia country border</span></span> +<span id="cb16-3"><a href="#cb16-3" aria-hidden="true" tabindex="-1"></a>education <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"education"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="co">#Import provincial administrative border of Cambodia</span></span> +<span id="cb16-4"><a href="#cb16-4" aria-hidden="true" tabindex="-1"></a>district <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"district"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="co">#Import district administrative border of Cambodia</span></span> +<span id="cb16-5"><a href="#cb16-5" aria-hidden="true" tabindex="-1"></a>road <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"road"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="co">#Import roads data in Cambodia</span></span> +<span id="cb16-6"><a href="#cb16-6" aria-hidden="true" tabindex="-1"></a>hospital <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"hospital"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="co">#Import hospital data in Cambodia</span></span> +<span id="cb16-7"><a href="#cb16-7" aria-hidden="true" tabindex="-1"></a>cases <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"cases"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="co">#Import example data of fever_cases in Cambodia</span></span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +</div> +</section> +<section id="themes" class="level3" data-number="4.2.2"> +<h3 data-number="4.2.2" class="anchored" data-anchor-id="themes"><span class="header-section-number">4.2.2</span> Themes</h3> +<p>The function <code>mf_theme()</code> defines a cartographic theme. Using a theme allows you to define several graphic parameters which are then applied to the maps created with <code>mapsf</code>. These parameters are: the map margins, the main color, the background color, the position and the aspect of the title. A theme can also be defined with the <code>mf_init()</code> and function <code>mf_export()</code>.</p> +<section id="use-a-predefined-theme" class="level4" data-number="4.2.2.1"> +<h4 data-number="4.2.2.1" class="anchored" data-anchor-id="use-a-predefined-theme"><span class="header-section-number">4.2.2.1</span> Use a predefined theme</h4> +<p>A series of predefined themes are available by default (see <code>?mf_theme</code>).</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb17"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb17-1"><a href="#cb17-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(mapsf)</span> +<span id="cb17-2"><a href="#cb17-2" aria-hidden="true" tabindex="-1"></a><span class="co"># use of a background color for the figure, to see the use of margin</span></span> +<span id="cb17-3"><a href="#cb17-3" aria-hidden="true" tabindex="-1"></a>opar <span class="ot"><-</span> <span class="fu">par</span>(<span class="at">mfrow =</span> <span class="fu">c</span>(<span class="dv">2</span>,<span class="dv">2</span>))</span> +<span id="cb17-4"><a href="#cb17-4" aria-hidden="true" tabindex="-1"></a><span class="co"># Using a predefined theme</span></span> +<span id="cb17-5"><a href="#cb17-5" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"default"</span>)</span> +<span id="cb17-6"><a href="#cb17-6" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb17-7"><a href="#cb17-7" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Theme : 'default'"</span>)</span> +<span id="cb17-8"><a href="#cb17-8" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb17-9"><a href="#cb17-9" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"darkula"</span>)</span> +<span id="cb17-10"><a href="#cb17-10" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb17-11"><a href="#cb17-11" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Theme : 'darkula'"</span>)</span> +<span id="cb17-12"><a href="#cb17-12" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb17-13"><a href="#cb17-13" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"candy"</span>)</span> +<span id="cb17-14"><a href="#cb17-14" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb17-15"><a href="#cb17-15" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Theme : 'candy'"</span>)</span> +<span id="cb17-16"><a href="#cb17-16" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb17-17"><a href="#cb17-17" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"nevermind"</span>)</span> +<span id="cb17-18"><a href="#cb17-18" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb17-19"><a href="#cb17-19" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Theme : 'nevermind'"</span>)</span> +<span id="cb17-20"><a href="#cb17-20" aria-hidden="true" tabindex="-1"></a><span class="fu">par</span>(opar)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/them1-1.png" class="img-fluid" width="768"></p> +</div> +</div> +</section> +<section id="modify-an-existing-theme" class="level4" data-number="4.2.2.2"> +<h4 data-number="4.2.2.2" class="anchored" data-anchor-id="modify-an-existing-theme"><span class="header-section-number">4.2.2.2</span> Modify an existing theme</h4> +<p>It is possible to modify an existing theme. In this example, we are using the “default†theme and modifying a few settings.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb18"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb18-1"><a href="#cb18-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(mapsf)</span> +<span id="cb18-2"><a href="#cb18-2" aria-hidden="true" tabindex="-1"></a>opar <span class="ot"><-</span> <span class="fu">par</span>(<span class="at">mfrow =</span> <span class="fu">c</span>(<span class="dv">1</span>,<span class="dv">2</span>))</span> +<span id="cb18-3"><a href="#cb18-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"default"</span>)</span> +<span id="cb18-4"><a href="#cb18-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb18-5"><a href="#cb18-5" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"default"</span>)</span> +<span id="cb18-6"><a href="#cb18-6" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb18-7"><a href="#cb18-7" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"default"</span>, <span class="at">tab =</span> <span class="cn">FALSE</span>, <span class="at">font =</span> <span class="dv">4</span>, <span class="at">bg =</span> <span class="st">"grey60"</span>, <span class="at">pos =</span> <span class="st">"center"</span>)</span> +<span id="cb18-8"><a href="#cb18-8" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb18-9"><a href="#cb18-9" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"modified default"</span>)</span> +<span id="cb18-10"><a href="#cb18-10" aria-hidden="true" tabindex="-1"></a><span class="fu">par</span>(opar)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/theme2-1.png" class="img-fluid" width="768"></p> +</div> +</div> +</section> +<section id="create-a-theme" class="level4" data-number="4.2.2.3"> +<h4 data-number="4.2.2.3" class="anchored" data-anchor-id="create-a-theme"><span class="header-section-number">4.2.2.3</span> Create a theme</h4> +<p>It is also possible to create a theme.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb19"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb19-1"><a href="#cb19-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(</span> +<span id="cb19-2"><a href="#cb19-2" aria-hidden="true" tabindex="-1"></a> <span class="at">bg =</span> <span class="st">"lightblue"</span>, <span class="co"># background color</span></span> +<span id="cb19-3"><a href="#cb19-3" aria-hidden="true" tabindex="-1"></a> <span class="at">fg =</span> <span class="st">"tomato1"</span>, <span class="co"># main color</span></span> +<span id="cb19-4"><a href="#cb19-4" aria-hidden="true" tabindex="-1"></a> <span class="at">mar =</span> <span class="fu">c</span>(<span class="dv">1</span>,<span class="dv">0</span>,<span class="fl">1.5</span>,<span class="dv">0</span>), <span class="co"># margin</span></span> +<span id="cb19-5"><a href="#cb19-5" aria-hidden="true" tabindex="-1"></a> <span class="at">tab =</span> <span class="cn">FALSE</span>, <span class="co"># "tab" style for the title</span></span> +<span id="cb19-6"><a href="#cb19-6" aria-hidden="true" tabindex="-1"></a> <span class="at">inner =</span> <span class="cn">FALSE</span>, <span class="co"># title inside or outside of map area</span></span> +<span id="cb19-7"><a href="#cb19-7" aria-hidden="true" tabindex="-1"></a> <span class="at">line =</span> <span class="fl">1.5</span>, <span class="co"># space dedicated to title</span></span> +<span id="cb19-8"><a href="#cb19-8" aria-hidden="true" tabindex="-1"></a> <span class="at">pos =</span> <span class="st">"center"</span>, <span class="co"># heading position</span></span> +<span id="cb19-9"><a href="#cb19-9" aria-hidden="true" tabindex="-1"></a> <span class="at">cex =</span> <span class="fl">1.5</span>, <span class="co"># title size</span></span> +<span id="cb19-10"><a href="#cb19-10" aria-hidden="true" tabindex="-1"></a> <span class="at">font =</span> <span class="dv">2</span> <span class="co"># font types for title</span></span> +<span id="cb19-11"><a href="#cb19-11" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb19-12"><a href="#cb19-12" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb19-13"><a href="#cb19-13" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"New theme"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/unnamed-chunk-4-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +</section> +<section id="titles" class="level3" data-number="4.2.3"> +<h3 data-number="4.2.3" class="anchored" data-anchor-id="titles"><span class="header-section-number">4.2.3</span> Titles</h3> +<p>The function <code>mf_title()</code> adds a title to a map.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb20"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb20-1"><a href="#cb20-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"default"</span>)</span> +<span id="cb20-2"><a href="#cb20-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb20-3"><a href="#cb20-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Map title"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/unnamed-chunk-5-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<p>It is possible to customize the appearance of the title</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb21"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb21-1"><a href="#cb21-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb21-2"><a href="#cb21-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(</span> +<span id="cb21-3"><a href="#cb21-3" aria-hidden="true" tabindex="-1"></a> <span class="at">txt =</span> <span class="st">"Map title"</span>, </span> +<span id="cb21-4"><a href="#cb21-4" aria-hidden="true" tabindex="-1"></a> <span class="at">pos =</span> <span class="st">"center"</span>, </span> +<span id="cb21-5"><a href="#cb21-5" aria-hidden="true" tabindex="-1"></a> <span class="at">tab =</span> <span class="cn">FALSE</span>, </span> +<span id="cb21-6"><a href="#cb21-6" aria-hidden="true" tabindex="-1"></a> <span class="at">bg =</span> <span class="st">"tomato3"</span>, </span> +<span id="cb21-7"><a href="#cb21-7" aria-hidden="true" tabindex="-1"></a> <span class="at">fg =</span> <span class="st">"lightblue"</span>, </span> +<span id="cb21-8"><a href="#cb21-8" aria-hidden="true" tabindex="-1"></a> <span class="at">cex =</span> <span class="fl">1.5</span>, </span> +<span id="cb21-9"><a href="#cb21-9" aria-hidden="true" tabindex="-1"></a> <span class="at">line =</span> <span class="fl">1.7</span>, </span> +<span id="cb21-10"><a href="#cb21-10" aria-hidden="true" tabindex="-1"></a> <span class="at">font =</span> <span class="dv">1</span>, </span> +<span id="cb21-11"><a href="#cb21-11" aria-hidden="true" tabindex="-1"></a> <span class="at">inner =</span> <span class="cn">FALSE</span></span> +<span id="cb21-12"><a href="#cb21-12" aria-hidden="true" tabindex="-1"></a>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/unnamed-chunk-6-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="arrow-orientation" class="level3" data-number="4.2.4"> +<h3 data-number="4.2.4" class="anchored" data-anchor-id="arrow-orientation"><span class="header-section-number">4.2.4</span> Arrow orientation</h3> +<p>The function <code>mf_arrow()</code> allows you to choose the position and aspect of orientation arrow.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb22"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb22-1"><a href="#cb22-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb22-2"><a href="#cb22-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_arrow</span>()</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/north-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="scale" class="level3" data-number="4.2.5"> +<h3 data-number="4.2.5" class="anchored" data-anchor-id="scale"><span class="header-section-number">4.2.5</span> Scale</h3> +<p>The function <code>mf_scale()</code> allows you to choose the position and the aspect of the scale.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb23"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb23-1"><a href="#cb23-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb23-2"><a href="#cb23-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_scale</span>(</span> +<span id="cb23-3"><a href="#cb23-3" aria-hidden="true" tabindex="-1"></a> <span class="at">size =</span> <span class="dv">60</span>,</span> +<span id="cb23-4"><a href="#cb23-4" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> <span class="dv">1</span>,</span> +<span id="cb23-5"><a href="#cb23-5" aria-hidden="true" tabindex="-1"></a> <span class="at">cex =</span> <span class="fl">0.7</span></span> +<span id="cb23-6"><a href="#cb23-6" aria-hidden="true" tabindex="-1"></a>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/scale-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="credits" class="level3" data-number="4.2.6"> +<h3 data-number="4.2.6" class="anchored" data-anchor-id="credits"><span class="header-section-number">4.2.6</span> Credits</h3> +<p>The function <code>mf_credits()</code> displays a line of credits (sources, author, etc.).</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb24"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb24-1"><a href="#cb24-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb24-2"><a href="#cb24-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_credits</span>(<span class="st">"IRD</span><span class="sc">\n</span><span class="st">Institut Pasteur du Cambodge, 2022"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/credit-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="complete-dressing" class="level3" data-number="4.2.7"> +<h3 data-number="4.2.7" class="anchored" data-anchor-id="complete-dressing"><span class="header-section-number">4.2.7</span> Complete dressing</h3> +<p>The function <code>mf_layout()</code> displays all these elements.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb25"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb25-1"><a href="#cb25-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb25-2"><a href="#cb25-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_layout</span>(</span> +<span id="cb25-3"><a href="#cb25-3" aria-hidden="true" tabindex="-1"></a> <span class="at">title =</span> <span class="st">"Cambodia"</span>,</span> +<span id="cb25-4"><a href="#cb25-4" aria-hidden="true" tabindex="-1"></a> <span class="at">credits =</span> <span class="st">"IRD</span><span class="sc">\n</span><span class="st">Institut Pasteur du Cambodge, 2022"</span>,</span> +<span id="cb25-5"><a href="#cb25-5" aria-hidden="true" tabindex="-1"></a> <span class="at">arrow =</span> <span class="cn">TRUE</span></span> +<span id="cb25-6"><a href="#cb25-6" aria-hidden="true" tabindex="-1"></a>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/layout1-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="annotations" class="level3" data-number="4.2.8"> +<h3 data-number="4.2.8" class="anchored" data-anchor-id="annotations"><span class="header-section-number">4.2.8</span> Annotations</h3> +<div class="cell"> +<div class="sourceCode cell-code" id="cb26"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb26-1"><a href="#cb26-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb26-2"><a href="#cb26-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_annotation</span>(district[district<span class="sc">$</span>ADM2_EN <span class="sc">==</span> <span class="st">"Bakan"</span>,], <span class="at">txt =</span> <span class="st">"Bakan"</span>, <span class="at">col_txt =</span> <span class="st">"darkred"</span>, <span class="at">halo =</span> <span class="cn">TRUE</span>, <span class="at">cex =</span> <span class="fl">1.5</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/unnamed-chunk-7-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="legends" class="level3" data-number="4.2.9"> +<h3 data-number="4.2.9" class="anchored" data-anchor-id="legends"><span class="header-section-number">4.2.9</span> Legends</h3> +<div class="cell"> +<div class="sourceCode cell-code" id="cb27"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb27-1"><a href="#cb27-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb27-2"><a href="#cb27-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_legend</span>(</span> +<span id="cb27-3"><a href="#cb27-3" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"prop"</span>, </span> +<span id="cb27-4"><a href="#cb27-4" aria-hidden="true" tabindex="-1"></a> <span class="at">val =</span> <span class="fu">c</span>(<span class="dv">1000</span>,<span class="dv">500</span>,<span class="dv">200</span>,<span class="dv">10</span>), </span> +<span id="cb27-5"><a href="#cb27-5" aria-hidden="true" tabindex="-1"></a> <span class="at">inches =</span> .<span class="dv">2</span>, </span> +<span id="cb27-6"><a href="#cb27-6" aria-hidden="true" tabindex="-1"></a> <span class="at">title =</span> <span class="st">"Population"</span>, </span> +<span id="cb27-7"><a href="#cb27-7" aria-hidden="true" tabindex="-1"></a> <span class="at">pos =</span> <span class="st">"topleft"</span></span> +<span id="cb27-8"><a href="#cb27-8" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb27-9"><a href="#cb27-9" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_legend</span>(</span> +<span id="cb27-10"><a href="#cb27-10" aria-hidden="true" tabindex="-1"></a> <span class="at">type =</span> <span class="st">"choro"</span>, </span> +<span id="cb27-11"><a href="#cb27-11" aria-hidden="true" tabindex="-1"></a> <span class="at">val =</span> <span class="fu">c</span>(<span class="dv">0</span>,<span class="dv">10</span>,<span class="dv">20</span>,<span class="dv">30</span>,<span class="dv">40</span>),</span> +<span id="cb27-12"><a href="#cb27-12" aria-hidden="true" tabindex="-1"></a> <span class="at">pal =</span> <span class="st">"Greens"</span>, </span> +<span id="cb27-13"><a href="#cb27-13" aria-hidden="true" tabindex="-1"></a> <span class="at">pos =</span> <span class="st">"bottomright"</span>, </span> +<span id="cb27-14"><a href="#cb27-14" aria-hidden="true" tabindex="-1"></a> <span class="at">val_rnd =</span> <span class="dv">0</span></span> +<span id="cb27-15"><a href="#cb27-15" aria-hidden="true" tabindex="-1"></a>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/unnamed-chunk-8-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="labels" class="level3" data-number="4.2.10"> +<h3 data-number="4.2.10" class="anchored" data-anchor-id="labels"><span class="header-section-number">4.2.10</span> Labels</h3> +<p>The function <code>mf_label()</code> is dedicated to displaying labels.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb28"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb28-1"><a href="#cb28-1" aria-hidden="true" tabindex="-1"></a>dist_selected <span class="ot"><-</span> district[<span class="fu">st_intersects</span>(district, district[district<span class="sc">$</span>ADM2_EN <span class="sc">==</span> <span class="st">"Bakan"</span>, ], <span class="at">sparse =</span> F), ]</span> +<span id="cb28-2"><a href="#cb28-2" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb28-3"><a href="#cb28-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_selected)</span> +<span id="cb28-4"><a href="#cb28-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_label</span>(</span> +<span id="cb28-5"><a href="#cb28-5" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> dist_selected,</span> +<span id="cb28-6"><a href="#cb28-6" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"ADM2_EN"</span>,</span> +<span id="cb28-7"><a href="#cb28-7" aria-hidden="true" tabindex="-1"></a> <span class="at">col=</span> <span class="st">"darkgreen"</span>,</span> +<span id="cb28-8"><a href="#cb28-8" aria-hidden="true" tabindex="-1"></a> <span class="at">halo =</span> <span class="cn">TRUE</span>,</span> +<span id="cb28-9"><a href="#cb28-9" aria-hidden="true" tabindex="-1"></a> <span class="at">overlap =</span> <span class="cn">FALSE</span>, </span> +<span id="cb28-10"><a href="#cb28-10" aria-hidden="true" tabindex="-1"></a> <span class="at">lines =</span> <span class="cn">FALSE</span></span> +<span id="cb28-11"><a href="#cb28-11" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb28-12"><a href="#cb28-12" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_scale</span>()</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/labs-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<p>The argument <code>halo = TRUE</code> allows to display a slight halo around the labels and the argument <code>overlap = FALSE</code> allows to create non-overlapping labels.</p> +</section> +<section id="center-the-map-on-a-region" class="level3" data-number="4.2.11"> +<h3 data-number="4.2.11" class="anchored" data-anchor-id="center-the-map-on-a-region"><span class="header-section-number">4.2.11</span> Center the map on a region</h3> +<p>The function <code>mf_init()</code> allows you to initialize a map by centering it on a spatial object.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb29"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb29-1"><a href="#cb29-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_init</span>(<span class="at">x =</span> dist_selected)</span> +<span id="cb29-2"><a href="#cb29-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb29-3"><a href="#cb29-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_selected, <span class="at">col =</span> <span class="cn">NA</span>, <span class="at">border =</span> <span class="st">"#29a3a3"</span>, <span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/unnamed-chunk-9-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="displaying-several-maps-on-the-sam-figure" class="level3" data-number="4.2.12"> +<h3 data-number="4.2.12" class="anchored" data-anchor-id="displaying-several-maps-on-the-sam-figure"><span class="header-section-number">4.2.12</span> Displaying several maps on the sam figure</h3> +<p>Here you have to use <code>mfrow</code> of the function <code>par()</code>. The first digit represents the number of of rows and second the number of columns.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb30"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb30-1"><a href="#cb30-1" aria-hidden="true" tabindex="-1"></a><span class="co"># define the figure layout (1 row, 2 columns)</span></span> +<span id="cb30-2"><a href="#cb30-2" aria-hidden="true" tabindex="-1"></a><span class="fu">par</span>(<span class="at">mfrow =</span> <span class="fu">c</span>(<span class="dv">1</span>, <span class="dv">2</span>))</span> +<span id="cb30-3"><a href="#cb30-3" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb30-4"><a href="#cb30-4" aria-hidden="true" tabindex="-1"></a><span class="co"># first map</span></span> +<span id="cb30-5"><a href="#cb30-5" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb30-6"><a href="#cb30-6" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="st">"Male"</span>, <span class="st">"prop"</span>, <span class="at">val_max =</span> <span class="dv">300000</span>)</span> +<span id="cb30-7"><a href="#cb30-7" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Population, male"</span>)</span> +<span id="cb30-8"><a href="#cb30-8" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb30-9"><a href="#cb30-9" aria-hidden="true" tabindex="-1"></a><span class="co"># second map</span></span> +<span id="cb30-10"><a href="#cb30-10" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district)</span> +<span id="cb30-11"><a href="#cb30-11" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="st">"Female"</span>, <span class="st">"prop"</span>, <span class="at">val_max =</span> <span class="dv">300000</span>)</span> +<span id="cb30-12"><a href="#cb30-12" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Population, female"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/mfrow0-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="exporting-maps" class="level3" data-number="4.2.13"> +<h3 data-number="4.2.13" class="anchored" data-anchor-id="exporting-maps"><span class="header-section-number">4.2.13</span> Exporting maps</h3> +<p>It is quite difficult to export figures (maps or others) whose height/width ratio is satisfactory. The default ratio of figures in png format is 1 (480x480 pixels):</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb31"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb31-1"><a href="#cb31-1" aria-hidden="true" tabindex="-1"></a>dist_filter <span class="ot"><-</span> district[district<span class="sc">$</span>ADM2_PCODE <span class="sc">==</span> <span class="st">"KH0808"</span>, ]</span> +<span id="cb31-2"><a href="#cb31-2" aria-hidden="true" tabindex="-1"></a><span class="fu">png</span>(<span class="st">"img/dist_filter_1.png"</span>)</span> +<span id="cb31-3"><a href="#cb31-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_filter)</span> +<span id="cb31-4"><a href="#cb31-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Filtered district"</span>)</span> +<span id="cb31-5"><a href="#cb31-5" aria-hidden="true" tabindex="-1"></a><span class="fu">dev.off</span>()</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +</div> +<div class="quarto-figure quarto-figure-center"> +<figure class="figure"> +<p><img src="img/dist_filter_1.png" class="img-fluid figure-img"></p> +</figure> +</div> +<p>On this map a lot of space is lost to the left and right of the district.</p> +<p>The function <code>mf_export()</code> allows exports of maps whose height/width ratio is controlled and corresponds to that of a spatial object.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb32"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb32-1"><a href="#cb32-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_export</span>(dist_filter, <span class="st">"img/dist_filter_2.png"</span>, <span class="at">width =</span> <span class="dv">480</span>)</span> +<span id="cb32-2"><a href="#cb32-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_filter)</span> +<span id="cb32-3"><a href="#cb32-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Filtered district"</span>)</span> +<span id="cb32-4"><a href="#cb32-4" aria-hidden="true" tabindex="-1"></a><span class="fu">dev.off</span>()</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +</div> +<div class="quarto-figure quarto-figure-center"> +<figure class="figure"> +<p><img src="img/dist_filter_2.png" class="img-fluid figure-img" width="218"></p> +</figure> +</div> +<p>The extent of this map is exactly that of the displayed region.</p> +</section> +<section id="adding-an-image-to-a-map" class="level3" data-number="4.2.14"> +<h3 data-number="4.2.14" class="anchored" data-anchor-id="adding-an-image-to-a-map"><span class="header-section-number">4.2.14</span> Adding an image to a map</h3> +<p>This can be useful for adding a logo, a pictograph. The function <code>readPNG()</code> of package <code>png</code> allows the additional images on the figure.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb33"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb33-1"><a href="#cb33-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"default"</span>, <span class="at">mar =</span> <span class="fu">c</span>(<span class="dv">0</span>,<span class="dv">0</span>,<span class="dv">0</span>,<span class="dv">0</span>))</span> +<span id="cb33-2"><a href="#cb33-2" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(png)</span> +<span id="cb33-3"><a href="#cb33-3" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb33-4"><a href="#cb33-4" aria-hidden="true" tabindex="-1"></a>logo <span class="ot"><-</span> <span class="fu">readPNG</span>(<span class="st">"img/ird_logo.png"</span>) <span class="co">#Import image</span></span> +<span id="cb33-5"><a href="#cb33-5" aria-hidden="true" tabindex="-1"></a>pp <span class="ot"><-</span> <span class="fu">dim</span>(logo)[<span class="dv">2</span><span class="sc">:</span><span class="dv">1</span>]<span class="sc">*</span><span class="dv">200</span> <span class="co">#Image dimension in map unit (width and height of the original image)</span></span> +<span id="cb33-6"><a href="#cb33-6" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb33-7"><a href="#cb33-7" aria-hidden="true" tabindex="-1"></a><span class="co">#The upper left corner of the department's bounding box</span></span> +<span id="cb33-8"><a href="#cb33-8" aria-hidden="true" tabindex="-1"></a>xy <span class="ot"><-</span> <span class="fu">st_bbox</span>(district)[<span class="fu">c</span>(<span class="dv">1</span>,<span class="dv">4</span>)]</span> +<span id="cb33-9"><a href="#cb33-9" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="at">col =</span> <span class="st">"#D1914D"</span>, <span class="at">border =</span> <span class="st">"white"</span>)</span> +<span id="cb33-10"><a href="#cb33-10" aria-hidden="true" tabindex="-1"></a><span class="fu">rasterImage</span>(</span> +<span id="cb33-11"><a href="#cb33-11" aria-hidden="true" tabindex="-1"></a> <span class="at">image =</span> logo,</span> +<span id="cb33-12"><a href="#cb33-12" aria-hidden="true" tabindex="-1"></a> <span class="at">xleft =</span> xy[<span class="dv">1</span>] ,</span> +<span id="cb33-13"><a href="#cb33-13" aria-hidden="true" tabindex="-1"></a> <span class="at">ybottom =</span> xy[<span class="dv">2</span>] <span class="sc">-</span> pp[<span class="dv">2</span>],</span> +<span id="cb33-14"><a href="#cb33-14" aria-hidden="true" tabindex="-1"></a> <span class="at">xright =</span> xy[<span class="dv">1</span>] <span class="sc">+</span> pp[<span class="dv">1</span>],</span> +<span id="cb33-15"><a href="#cb33-15" aria-hidden="true" tabindex="-1"></a> <span class="at">ytop =</span> xy[<span class="dv">2</span>]</span> +<span id="cb33-16"><a href="#cb33-16" aria-hidden="true" tabindex="-1"></a>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/logo-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="place-an-item-precisely-on-the-map" class="level3" data-number="4.2.15"> +<h3 data-number="4.2.15" class="anchored" data-anchor-id="place-an-item-precisely-on-the-map"><span class="header-section-number">4.2.15</span> Place an item precisely on the map</h3> +<p>The function <code>locator()</code> allows clicking on the figure and obtaining the coordinate of a point in the coordinate system of the figure (of the map).</p> +<div class="cell"> +<pre class="place cell-code"><code># locator(1) # click to get coordinate on map +# points(locator(1)) # click to plot point on map +# text(locator(1), # click to place the item on map +# labels ="Located any texts on map", +# adj = c(0,0)) +</code></pre> +</div> +<p><video src="img/locator.webm" class="img-fluid" controls=""><a href="img/locator.webm">Video</a></video></p> +<p><code>locator()</code>peut être utilisée sur la plupart des graphiques (pas ceux produits avec <code>ggplot2</code>).</p> +<div class="callout-note callout callout-style-simple no-icon"> +<div class="callout-body d-flex"> +<div class="callout-icon-container"> +<i class="callout-icon no-icon"></i> +</div> +<div class="callout-body-container"> +<p><a href="https://rgeomatic.hypotheses.org/1837">How to interactively position legends and layout elements on a map with cartography</a></p> +</div> +</div> +</div> +</section> +<section id="add-shading-to-a-layer" class="level3" data-number="4.2.16"> +<h3 data-number="4.2.16" class="anchored" data-anchor-id="add-shading-to-a-layer"><span class="header-section-number">4.2.16</span> Add shading to a layer</h3> +<p>The function <code>mf_shadow()</code> allows to create a shadow to a layer of polygons.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb35"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb35-1"><a href="#cb35-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_shadow</span>(district)</span> +<span id="cb35-2"><a href="#cb35-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="at">add=</span><span class="cn">TRUE</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/shadow-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="creating-boxes" class="level3" data-number="4.2.17"> +<h3 data-number="4.2.17" class="anchored" data-anchor-id="creating-boxes"><span class="header-section-number">4.2.17</span> Creating Boxes</h3> +<p>The function <code>mf_inset_on()</code> allows to start creation a box. You must then “close†the box with <code>mf_inset_off()</code>.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb36"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb36-1"><a href="#cb36-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_init</span>(<span class="at">x =</span> dist_selected, <span class="at">theme =</span> <span class="st">"agolalight"</span>, <span class="at">expandBB =</span> <span class="fu">c</span>(<span class="dv">0</span>,.<span class="dv">1</span>,<span class="dv">0</span>,.<span class="dv">5</span>)) </span> +<span id="cb36-2"><a href="#cb36-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb36-3"><a href="#cb36-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_selected, <span class="at">col =</span> <span class="st">"tomato4"</span>, <span class="at">border =</span> <span class="st">"tomato1"</span>, <span class="at">lwd =</span> <span class="dv">2</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb36-4"><a href="#cb36-4" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb36-5"><a href="#cb36-5" aria-hidden="true" tabindex="-1"></a><span class="co"># Cambodia inset box</span></span> +<span id="cb36-6"><a href="#cb36-6" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_inset_on</span>(<span class="at">x =</span> country, <span class="at">pos =</span> <span class="st">"topright"</span>, <span class="at">cex =</span> .<span class="dv">3</span>)</span> +<span id="cb36-7"><a href="#cb36-7" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(country, <span class="at">lwd =</span> .<span class="dv">5</span>, <span class="at">border=</span> <span class="st">"grey90"</span>)</span> +<span id="cb36-8"><a href="#cb36-8" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_selected, <span class="at">col =</span> <span class="st">"tomato4"</span>, <span class="at">border =</span> <span class="st">"tomato1"</span>, <span class="at">lwd =</span> .<span class="dv">5</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb36-9"><a href="#cb36-9" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_scale</span>(<span class="at">size =</span> <span class="dv">100</span>, <span class="at">pos =</span> <span class="st">"bottomleft"</span>, <span class="at">cex =</span> .<span class="dv">6</span>, <span class="at">lwd =</span> .<span class="dv">5</span>)</span> +<span id="cb36-10"><a href="#cb36-10" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_inset_off</span>()</span> +<span id="cb36-11"><a href="#cb36-11" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb36-12"><a href="#cb36-12" aria-hidden="true" tabindex="-1"></a><span class="co"># District inset box</span></span> +<span id="cb36-13"><a href="#cb36-13" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_inset_on</span>(<span class="at">x =</span> district, <span class="at">pos =</span> <span class="st">"bottomright"</span>, <span class="at">cex =</span> .<span class="dv">3</span>)</span> +<span id="cb36-14"><a href="#cb36-14" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="at">lwd =</span> <span class="fl">0.5</span>, <span class="at">border=</span> <span class="st">"grey90"</span>)</span> +<span id="cb36-15"><a href="#cb36-15" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_selected, <span class="at">col =</span> <span class="st">"tomato4"</span>, <span class="at">border =</span> <span class="st">"tomato1"</span>, <span class="at">lwd =</span> .<span class="dv">5</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb36-16"><a href="#cb36-16" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_scale</span>(<span class="at">size =</span> <span class="dv">100</span>, <span class="at">pos =</span> <span class="st">"bottomright"</span>, <span class="at">cex =</span> .<span class="dv">6</span>, <span class="at">lwd =</span> .<span class="dv">5</span>)</span> +<span id="cb36-17"><a href="#cb36-17" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_inset_off</span>()</span> +<span id="cb36-18"><a href="#cb36-18" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb36-19"><a href="#cb36-19" aria-hidden="true" tabindex="-1"></a><span class="co"># World inset box</span></span> +<span id="cb36-20"><a href="#cb36-20" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_inset_on</span>(<span class="at">x =</span> <span class="st">"worldmap"</span>, <span class="at">pos =</span> <span class="st">"topleft"</span>)</span> +<span id="cb36-21"><a href="#cb36-21" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_worldmap</span>(dist_selected, <span class="at">land_col =</span> <span class="st">"#cccccc"</span>, <span class="at">border_col =</span> <span class="cn">NA</span>, </span> +<span id="cb36-22"><a href="#cb36-22" aria-hidden="true" tabindex="-1"></a> <span class="at">water_col =</span> <span class="st">"#e3e3e3"</span>, <span class="at">col =</span> <span class="st">"tomato4"</span>)</span> +<span id="cb36-23"><a href="#cb36-23" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb36-24"><a href="#cb36-24" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_inset_off</span>()</span> +<span id="cb36-25"><a href="#cb36-25" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Bakan district and its surroundings"</span>)</span> +<span id="cb36-26"><a href="#cb36-26" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_scale</span>(<span class="dv">10</span>, <span class="at">pos =</span> <span class="st">'bottomleft'</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/inset-1.png" class="img-fluid" width="624"></p> +</div> +</div> +</section> +</section> +<section id="d-maps" class="level2" data-number="4.3"> +<h2 data-number="4.3" class="anchored" data-anchor-id="d-maps"><span class="header-section-number">4.3</span> 3D maps</h2> +<section id="linemap" class="level3" data-number="4.3.1"> +<h3 data-number="4.3.1" class="anchored" data-anchor-id="linemap"><span class="header-section-number">4.3.1</span> linemap</h3> +<p>The package <code>linemap</code> <span class="citation" data-cites="linemap">(<a href="references.html#ref-linemap" role="doc-biblioref">Giraud 2021</a>)</span> allows you to make maps made up of lines.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb37"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb37-1"><a href="#cb37-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(linemap)</span> +<span id="cb37-2"><a href="#cb37-2" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(mapsf)</span> +<span id="cb37-3"><a href="#cb37-3" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(sf)</span> +<span id="cb37-4"><a href="#cb37-4" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(dplyr)</span> +<span id="cb37-5"><a href="#cb37-5" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb37-6"><a href="#cb37-6" aria-hidden="true" tabindex="-1"></a>pp <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/PP.gpkg"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="co"># import Phnom Penh administrative border</span></span> +<span id="cb37-7"><a href="#cb37-7" aria-hidden="true" tabindex="-1"></a>pp_pop_dens <span class="ot"><-</span> <span class="fu">getgrid</span>(<span class="at">x =</span> pp, <span class="at">cellsize =</span><span class="dv">1000</span>, <span class="at">var =</span> <span class="st">"DENs"</span>) <span class="co"># create population density in grid format (pop density/1km)</span></span> +<span id="cb37-8"><a href="#cb37-8" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb37-9"><a href="#cb37-9" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_init</span>(pp)</span> +<span id="cb37-10"><a href="#cb37-10" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb37-11"><a href="#cb37-11" aria-hidden="true" tabindex="-1"></a><span class="fu">linemap</span>(</span> +<span id="cb37-12"><a href="#cb37-12" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> pp_pop_dens, </span> +<span id="cb37-13"><a href="#cb37-13" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"DENs"</span>,</span> +<span id="cb37-14"><a href="#cb37-14" aria-hidden="true" tabindex="-1"></a> <span class="at">k =</span> <span class="dv">1</span>,</span> +<span id="cb37-15"><a href="#cb37-15" aria-hidden="true" tabindex="-1"></a> <span class="at">threshold =</span> <span class="dv">5</span>, </span> +<span id="cb37-16"><a href="#cb37-16" aria-hidden="true" tabindex="-1"></a> <span class="at">lwd =</span> <span class="dv">1</span>,</span> +<span id="cb37-17"><a href="#cb37-17" aria-hidden="true" tabindex="-1"></a> <span class="at">col =</span> <span class="st">"ivory1"</span>,</span> +<span id="cb37-18"><a href="#cb37-18" aria-hidden="true" tabindex="-1"></a> <span class="at">border =</span> <span class="st">"ivory4"</span>,</span> +<span id="cb37-19"><a href="#cb37-19" aria-hidden="true" tabindex="-1"></a> <span class="at">add =</span> T)</span> +<span id="cb37-20"><a href="#cb37-20" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb37-21"><a href="#cb37-21" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Phnom Penh Population Density, 2019"</span>)</span> +<span id="cb37-22"><a href="#cb37-22" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_credits</span>(<span class="st">"Humanitarian Data Exchange, 2022</span><span class="sc">\n</span><span class="st">unit data:km2"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/linemap-1.png" class="img-fluid" width="672"></p> +</div> +<div class="sourceCode cell-code" id="cb38"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb38-1"><a href="#cb38-1" aria-hidden="true" tabindex="-1"></a><span class="co"># url = "https://data.humdata.org/dataset/1803994d-6218-4b98-ac3a-30c7f85c6dbc/resource/f30b0f4b-1c40-45f3-986d-2820375ea8dd/download/health_facility.zip"</span></span> +<span id="cb38-2"><a href="#cb38-2" aria-hidden="true" tabindex="-1"></a><span class="co"># health_facility.zip = "health_facility.zip"</span></span> +<span id="cb38-3"><a href="#cb38-3" aria-hidden="true" tabindex="-1"></a><span class="co"># download.file(url, destfile = health_facility.zip)</span></span> +<span id="cb38-4"><a href="#cb38-4" aria-hidden="true" tabindex="-1"></a><span class="co"># unzip(health_facility.zip) # Unzipped files are in a new folder named Health</span></span> +<span id="cb38-5"><a href="#cb38-5" aria-hidden="true" tabindex="-1"></a><span class="co"># list.files(path="Health")</span></span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +</div> +</section> +<section id="relief-tanaka" class="level3" data-number="4.3.2"> +<h3 data-number="4.3.2" class="anchored" data-anchor-id="relief-tanaka"><span class="header-section-number">4.3.2</span> Relief Tanaka</h3> +<p>We use the <code>tanaka</code> package <span class="citation" data-cites="tanaka">(<a href="references.html#ref-tanaka" role="doc-biblioref">Giraud 2022b</a>)</span> which provides a method <span class="citation" data-cites="tanaka1950">(<a href="references.html#ref-tanaka1950" role="doc-biblioref">Tanaka 1950</a>)</span> used to improve the perception of relief.</p> +<div class="cell"> +<div class="sourceCode cell-code" id="cb39"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb39-1"><a href="#cb39-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(tanaka)</span> +<span id="cb39-2"><a href="#cb39-2" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(terra)</span> +<span id="cb39-3"><a href="#cb39-3" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb39-4"><a href="#cb39-4" aria-hidden="true" tabindex="-1"></a>rpop <span class="ot"><-</span> <span class="fu">rast</span>(<span class="st">"data_cambodia/khm_pd_2019_1km_utm.tif"</span>) <span class="co"># Import population raster data (in UTM)</span></span> +<span id="cb39-5"><a href="#cb39-5" aria-hidden="true" tabindex="-1"></a>district <span class="ot">=</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"district"</span>, <span class="at">quiet =</span> <span class="cn">TRUE</span>) <span class="co"># Import Cambodian districts layer</span></span> +<span id="cb39-6"><a href="#cb39-6" aria-hidden="true" tabindex="-1"></a>district <span class="ot"><-</span> <span class="fu">st_transform</span>(district, <span class="fu">st_crs</span>(rpop)) <span class="co"># Transform data into the same coordinate system</span></span> +<span id="cb39-7"><a href="#cb39-7" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb39-8"><a href="#cb39-8" aria-hidden="true" tabindex="-1"></a>mat <span class="ot"><-</span> <span class="fu">focalMat</span>(<span class="at">x =</span> rpop, <span class="at">d =</span> <span class="fu">c</span>(<span class="dv">1500</span>), <span class="at">type =</span> <span class="st">"Gauss"</span>) <span class="co"># Raster smoothing</span></span> +<span id="cb39-9"><a href="#cb39-9" aria-hidden="true" tabindex="-1"></a>rpopl <span class="ot"><-</span> <span class="fu">focal</span>(<span class="at">x =</span> rpop, <span class="at">w =</span> mat, <span class="at">fun =</span> sum, <span class="at">na.rm =</span> <span class="cn">TRUE</span>)</span> +<span id="cb39-10"><a href="#cb39-10" aria-hidden="true" tabindex="-1"></a></span> +<span id="cb39-11"><a href="#cb39-11" aria-hidden="true" tabindex="-1"></a><span class="co"># Mapping</span></span> +<span id="cb39-12"><a href="#cb39-12" aria-hidden="true" tabindex="-1"></a>cols <span class="ot"><-</span> <span class="fu">hcl.colors</span>(<span class="dv">8</span>, <span class="st">"Reds"</span>, <span class="at">alpha =</span> <span class="dv">1</span>, <span class="at">rev =</span> T)[<span class="sc">-</span><span class="dv">1</span>]</span> +<span id="cb39-13"><a href="#cb39-13" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_theme</span>(<span class="st">"agolalight"</span>)</span> +<span id="cb39-14"><a href="#cb39-14" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_init</span>(district)</span> +<span id="cb39-15"><a href="#cb39-15" aria-hidden="true" tabindex="-1"></a><span class="fu">tanaka</span>(<span class="at">x =</span> rpop, <span class="at">breaks =</span> <span class="fu">c</span>(<span class="dv">0</span>,<span class="dv">10</span>,<span class="dv">25</span>,<span class="dv">50</span>,<span class="dv">100</span>,<span class="dv">250</span>,<span class="dv">500</span>,<span class="dv">64265</span>),</span> +<span id="cb39-16"><a href="#cb39-16" aria-hidden="true" tabindex="-1"></a> <span class="at">col =</span> cols, <span class="at">add =</span> T, <span class="at">mask =</span> district, <span class="at">legend.pos =</span> <span class="st">"n"</span>)</span> +<span id="cb39-17"><a href="#cb39-17" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_legend</span>(<span class="at">type =</span> <span class="st">"choro"</span>, <span class="at">pos =</span> <span class="st">"bottomright"</span>, </span> +<span id="cb39-18"><a href="#cb39-18" aria-hidden="true" tabindex="-1"></a> <span class="at">val =</span> <span class="fu">c</span>(<span class="dv">0</span>,<span class="dv">10</span>,<span class="dv">25</span>,<span class="dv">50</span>,<span class="dv">100</span>,<span class="dv">250</span>,<span class="dv">500</span>,<span class="dv">64265</span>), <span class="at">pal =</span> cols,</span> +<span id="cb39-19"><a href="#cb39-19" aria-hidden="true" tabindex="-1"></a> <span class="at">bg =</span> <span class="st">"#EDF4F5"</span>, <span class="at">fg =</span> <span class="cn">NA</span>, <span class="at">frame =</span> T, <span class="at">val_rnd =</span> <span class="dv">0</span>,</span> +<span id="cb39-20"><a href="#cb39-20" aria-hidden="true" tabindex="-1"></a> <span class="at">title =</span> <span class="st">"Population</span><span class="sc">\n</span><span class="st">per km2"</span>)</span> +<span id="cb39-21"><a href="#cb39-21" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Population density of Cambodia, 2019"</span>)</span> +<span id="cb39-22"><a href="#cb39-22" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_credits</span>(<span class="st">"Humanitarian Data Exchange, 2022"</span>,</span> +<span id="cb39-23"><a href="#cb39-23" aria-hidden="true" tabindex="-1"></a> <span class="at">bg =</span> <span class="st">"#EDF4F5"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/tanaka-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<div class="callout-note callout callout-style-simple no-icon"> +<div class="callout-body d-flex"> +<div class="callout-icon-container"> +<i class="callout-icon no-icon"></i> +</div> +<div class="callout-body-container"> +<p><a href="https://rgeomatic.hypotheses.org/1758">The tanaka package</a></p> +</div> +</div> +</div> +</section> +</section> +<section id="cartographic-transformation" class="level2" data-number="4.4"> +<h2 data-number="4.4" class="anchored" data-anchor-id="cartographic-transformation"><span class="header-section-number">4.4</span> Cartographic Transformation</h2> +<blockquote class="blockquote"> +<p>classical anamorphosis is a representation of States(or any cells) by <strong>rectangle or any polygons</strong> according to a <strong>quantities</strong> attached to them. (…) We strive to <strong>keep the general arrangement</strong> of meshes or the silhouette of the continent.â€<br> +<span class="citation" data-cites="Brunet93">Brunet, Ferras, and Théry (<a href="references.html#ref-Brunet93" role="doc-biblioref">1993</a>)</span></p> +</blockquote> +<p>3 types of anamorphoses or cartograms are presented here:</p> +<ul> +<li>Dorling’s cartograms <span class="citation" data-cites="Dorling96">(<a href="references.html#ref-Dorling96" role="doc-biblioref">Dorling 1996</a>)</span></li> +<li>Non-contiguous cartograms <span class="citation" data-cites="Olson76">(<a href="references.html#ref-Olson76" role="doc-biblioref">Olson 1976</a>)</span></li> +<li>Contiguous cartograms <span class="citation" data-cites="Dougenik85">(<a href="references.html#ref-Dougenik85" role="doc-biblioref">Dougenik, Chrisman, and Niemeyer 1985</a>)</span></li> +</ul> +<div class="callout-note callout callout-style-simple no-icon"> +<div class="callout-body d-flex"> +<div class="callout-icon-container"> +<i class="callout-icon no-icon"></i> +</div> +<div class="callout-body-container"> +<p>A comprehensive course on anamorphoses : <a href="https://neocarto.hypotheses.org/366">Les anamorphoses cartographiques</a> <span class="citation" data-cites="Lambert15">(<a href="references.html#ref-Lambert15" role="doc-biblioref">Lambert 2015</a>)</span>.</p> +</div> +</div> +</div> +<div class="callout-note callout callout-style-simple no-icon"> +<div class="callout-body d-flex"> +<div class="callout-icon-container"> +<i class="callout-icon no-icon"></i> +</div> +<div class="callout-body-container"> +<p><a href="https://rgeomatic.hypotheses.org/1361">Make cartograms with R</a></p> +</div> +</div> +</div> +<p>To make the cartograms we use the package <code>cartogram</code> <span class="citation" data-cites="cartogram">(<a href="references.html#ref-cartogram" role="doc-biblioref">Jeworutzki 2020</a>)</span>.</p> +<section id="dorlings-cartograms" class="level3" data-number="4.4.1"> +<h3 data-number="4.4.1" class="anchored" data-anchor-id="dorlings-cartograms"><span class="header-section-number">4.4.1</span> Dorling’s cartograms</h3> +<p>The territories are represented by figures (circles, squares or rectangles) which do not overlap, the surface of which are proportional to a variable. The proportion of the figures are defined according to the starting positions.</p> +<div class="quarto-figure quarto-figure-center"> +<figure class="figure"> +<p><img src="img/dorling.png" class="img-fluid figure-img" width="600"></p> +</figure> +</div> +<div class="cell" type="rmdmoins"> + +<div class="rmdmoins"> +Space is quite poorly identified.<br> +You can name the circles to get your bearings and/or use the color to make clusters appear and better identify the geographical blocks. +</div> +</div> +<div class="cell" type="rmdplus"> + +<div class="rmdplus"> +The perception of quantities is very good. The circle sizes are really comarable. +</div> +</div> +<div class="cell"> +<div class="sourceCode cell-code" id="cb40"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb40-1"><a href="#cb40-1" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(mapsf)</span> +<span id="cb40-2"><a href="#cb40-2" aria-hidden="true" tabindex="-1"></a><span class="fu">library</span>(cartogram)</span> +<span id="cb40-3"><a href="#cb40-3" aria-hidden="true" tabindex="-1"></a>district <span class="ot"><-</span> <span class="fu">st_read</span>(<span class="st">"data_cambodia/cambodia.gpkg"</span>, <span class="at">layer =</span> <span class="st">"district"</span> , <span class="at">quiet =</span> <span class="cn">TRUE</span>)</span> +<span id="cb40-4"><a href="#cb40-4" aria-hidden="true" tabindex="-1"></a>dist_dorling <span class="ot"><-</span> <span class="fu">cartogram_dorling</span>(<span class="at">x =</span> district, <span class="at">weight =</span> <span class="st">"T_POP"</span>, <span class="at">k =</span> <span class="fl">0.7</span>)</span> +<span id="cb40-5"><a href="#cb40-5" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_dorling, <span class="at">col =</span> <span class="st">"#40E0D0"</span>, <span class="at">border=</span> <span class="st">"white"</span>)</span> +<span id="cb40-6"><a href="#cb40-6" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_label</span>(</span> +<span id="cb40-7"><a href="#cb40-7" aria-hidden="true" tabindex="-1"></a> <span class="at">x =</span> dist_dorling[<span class="fu">order</span>(dist_dorling<span class="sc">$</span>T_POP, <span class="at">decreasing =</span> <span class="cn">TRUE</span>), ][<span class="dv">1</span><span class="sc">:</span><span class="dv">10</span>,], </span> +<span id="cb40-8"><a href="#cb40-8" aria-hidden="true" tabindex="-1"></a> <span class="at">var =</span> <span class="st">"ADM2_EN"</span>,</span> +<span id="cb40-9"><a href="#cb40-9" aria-hidden="true" tabindex="-1"></a> <span class="at">overlap =</span> <span class="cn">FALSE</span>, </span> +<span id="cb40-10"><a href="#cb40-10" aria-hidden="true" tabindex="-1"></a> <span class="co"># show.lines = FALSE,</span></span> +<span id="cb40-11"><a href="#cb40-11" aria-hidden="true" tabindex="-1"></a> <span class="at">halo =</span> <span class="cn">TRUE</span>, </span> +<span id="cb40-12"><a href="#cb40-12" aria-hidden="true" tabindex="-1"></a> <span class="at">r =</span> <span class="fl">0.15</span></span> +<span id="cb40-13"><a href="#cb40-13" aria-hidden="true" tabindex="-1"></a>)</span> +<span id="cb40-14"><a href="#cb40-14" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Population of District - Dorling Cartogram"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/dorling-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<p>The parameter <code>k</code> allows to vary the expansion factor of the circles.</p> +</section> +<section id="non-continuous-cartograms" class="level3" data-number="4.4.2"> +<h3 data-number="4.4.2" class="anchored" data-anchor-id="non-continuous-cartograms"><span class="header-section-number">4.4.2</span> Non-continuous cartograms</h3> +<p>The size of the polygons is proportional to a variable. The arrangement of the polygons relative to each other is preserved. The shape of the polygons is similar.</p> +<div class="quarto-figure quarto-figure-center"> +<figure class="figure"> +<p><img src="img/nccartogram.png" class="img-fluid figure-img"></p> +</figure> +</div> +<p><span class="citation" data-cites="Cauvin13">(<a href="references.html#ref-Cauvin13" role="doc-biblioref">Cauvin, Escobar, and Serradj 2013</a>)</span></p> +<div class="cell" type="rmdmoins"> + +<div class="rmdmoins"> +The topology of the regions is lost. +</div> +</div> +<div class="cell" type="rmdplus"> + +<div class="rmdplus"> +The converstion of the polygons shape is optimal. +</div> +</div> +<div class="cell"> +<div class="sourceCode cell-code" id="cb41"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb41-1"><a href="#cb41-1" aria-hidden="true" tabindex="-1"></a>dist_ncont <span class="ot"><-</span> <span class="fu">cartogram_ncont</span>(<span class="at">x =</span> district, <span class="at">weight =</span> <span class="st">"T_POP"</span>, <span class="at">k =</span> <span class="fl">1.2</span>)</span> +<span id="cb41-2"><a href="#cb41-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="at">col =</span> <span class="cn">NA</span>, <span class="at">border =</span> <span class="st">"#FDFEFE"</span>, <span class="at">lwd =</span> <span class="fl">1.5</span>)</span> +<span id="cb41-3"><a href="#cb41-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_ncont, <span class="at">col =</span> <span class="st">"#20B2AA"</span>, <span class="at">border=</span> <span class="st">"white"</span>, <span class="at">add =</span> <span class="cn">TRUE</span>)</span> +<span id="cb41-4"><a href="#cb41-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Population of District - Non-continuous cartograms"</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/olson-1.png" class="img-fluid" width="672"></p> +</div> +</div> +<p>The parameter <code>k</code> allows to vary the expansion of the polygons.</p> +</section> +<section id="continuous-cartograms" class="level3" data-number="4.4.3"> +<h3 data-number="4.4.3" class="anchored" data-anchor-id="continuous-cartograms"><span class="header-section-number">4.4.3</span> Continuous cartograms</h3> +<p>The size of the polygons is proportional to variable. The arrangement of the polygons relative to each other is preserved. To maintain contiguity, the sape of the polygons is heavily transformed.</p> +<div class="quarto-figure quarto-figure-center"> +<figure class="figure"> +<p><img src="img/cartogram.jpg" class="img-fluid figure-img" width="600"></p> +</figure> +</div> +<p><span class="citation" data-cites="Paull16">(<a href="references.html#ref-Paull16" role="doc-biblioref">Paull and Hennig 2016</a>)</span></p> +<div class="cell" type="rmdmoins"> + +<div class="rmdmoins"> +The shape of the polygond is strongly distorted. +</div> +</div> +<div class="cell" type="rmdplus"> + +<div class="rmdplus"> +<p>It is a “real geographical mapâ€: topology and contiguity are preserved.</p> +</div> +</div> +<div class="cell"> +<div class="sourceCode cell-code" id="cb42"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb42-1"><a href="#cb42-1" aria-hidden="true" tabindex="-1"></a>dist_ncont <span class="ot"><-</span> <span class="fu">cartogram_cont</span>(<span class="at">x =</span> district, <span class="at">weight =</span> <span class="st">"DENs"</span>, <span class="at">maxSizeError =</span> <span class="dv">6</span>)</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output cell-output-stderr"> +<pre><code>Mean size error for iteration 1: 15.8686749410166</code></pre> +</div> +<div class="cell-output cell-output-stderr"> +<pre><code>Mean size error for iteration 2: 12.1107731631101</code></pre> +</div> +<div class="cell-output cell-output-stderr"> +<pre><code>Mean size error for iteration 3: 9.98940057337996</code></pre> +</div> +<div class="cell-output cell-output-stderr"> +<pre><code>Mean size error for iteration 4: 8.62323208787643</code></pre> +</div> +<div class="cell-output cell-output-stderr"> +<pre><code>Mean size error for iteration 5: 7.60706404894655</code></pre> +</div> +<div class="cell-output cell-output-stderr"> +<pre><code>Mean size error for iteration 6: 6.83561617758241</code></pre> +</div> +<div class="cell-output cell-output-stderr"> +<pre><code>Mean size error for iteration 7: 10.1399490743501</code></pre> +</div> +<div class="cell-output cell-output-stderr"> +<pre><code>Mean size error for iteration 8: 5.79418495291592</code></pre> +</div> +<div class="sourceCode cell-code" id="cb51"><pre class="sourceCode r code-with-copy"><code class="sourceCode r"><span id="cb51-1"><a href="#cb51-1" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(dist_ncont, <span class="at">col =</span> <span class="st">"#66CDAA"</span>, <span class="at">border=</span> <span class="st">"white"</span>, <span class="at">add =</span> <span class="cn">FALSE</span>)</span> +<span id="cb51-2"><a href="#cb51-2" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_title</span>(<span class="st">"Population of District - Continuous cartograms"</span>)</span> +<span id="cb51-3"><a href="#cb51-3" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_inset_on</span>(district, <span class="at">cex =</span> .<span class="dv">2</span>, <span class="at">pos =</span> <span class="st">"bottomleft"</span>)</span> +<span id="cb51-4"><a href="#cb51-4" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_map</span>(district, <span class="at">lwd =</span> .<span class="dv">5</span>)</span> +<span id="cb51-5"><a href="#cb51-5" aria-hidden="true" tabindex="-1"></a><span class="fu">mf_inset_off</span>()</span></code><button title="Copy to Clipboard" class="code-copy-button"><i class="bi"></i></button></pre></div> +<div class="cell-output-display"> +<p><img src="05-mapping_with_r_files/figure-html/dougenik-1.png" class="img-fluid" width="672"></p> +</div> +</div> +</section> +<section id="stengths-and-weaknessses-of-cartograms" class="level3" data-number="4.4.4"> +<h3 data-number="4.4.4" class="anchored" data-anchor-id="stengths-and-weaknessses-of-cartograms"><span class="header-section-number">4.4.4</span> Stengths and weaknessses of cartograms</h3> +<p>cartograms are cartographic representations perceived as <strong>innovative</strong> (although the method is 40 years old). These very generalize images capture <strong>quantities</strong> and <strong>gradients</strong> well. These are real <strong>communication</strong> images that <strong>provoke</strong>, arouse <strong>interest</strong>, convey a strong <strong>message</strong>, <strong>challenge</strong>.</p> +<p>But cartograms induce a loss of <strong>visual cues</strong> (difficult to find one’s country or region on the map), require a <strong>reading effort</strong> which can be significant and do not make it possible to manage <strong>missing data</strong>.</p> + + +<div id="refs" class="references csl-bib-body hanging-indent" role="doc-bibliography" style="display: none"> +<div id="ref-Brunet93" class="csl-entry" role="doc-biblioentry"> +Brunet, Roger, Robert Ferras, and Hervé Théry. 1993. <em>Les Mots de La g<span>é</span>ographie: Dictionnaire Critique</em>. 03) 911 BRU. +</div> +<div id="ref-Cauvin13" class="csl-entry" role="doc-biblioentry"> +Cauvin, Colette, Francisco Escobar, and Aziz Serradj. 2013. <em>Thematic Cartography, Cartography and the Impact of the Quantitative Revolution</em>. Vol. 2. John Wiley & Sons. +</div> +<div id="ref-Dorling96" class="csl-entry" role="doc-biblioentry"> +Dorling, Daniel. 1996. <em>Area Cartograms: Their Use and Creation, Concepts and Techniques in Modern Geography</em>. Vol. 59. CATMOG: Concepts and Techniques in Modern Geography. Institute of British Geographers. +</div> +<div id="ref-Dougenik85" class="csl-entry" role="doc-biblioentry"> +Dougenik, James A, Nicholas R Chrisman, and Duane R Niemeyer. 1985. <span>“An Algorithm to Construct Continuous Area Cartograms.â€</span> <em>The Professional Geographer</em> 37 (1): 75–81. +</div> +<div id="ref-linemap" class="csl-entry" role="doc-biblioentry"> +Giraud, Timothée. 2021. <span>“Linemap: Line Maps.â€</span> <a href="https://CRAN.R-project.org/package=linemap">https://CRAN.R-project.org/package=linemap</a>. +</div> +<div id="ref-mapsf" class="csl-entry" role="doc-biblioentry"> +———. 2022a. <span>“Mapsf: Thematic Cartography.â€</span> <a href="https://CRAN.R-project.org/package=mapsf">https://CRAN.R-project.org/package=mapsf</a>. +</div> +<div id="ref-tanaka" class="csl-entry" role="doc-biblioentry"> +———. 2022b. <span>“Tanaka: Design Shaded Contour Lines (or Tanaka) Maps.â€</span> <a href="https://CRAN.R-project.org/package=tanaka">https://CRAN.R-project.org/package=tanaka</a>. +</div> +<div id="ref-cartogram" class="csl-entry" role="doc-biblioentry"> +Jeworutzki, Sebastian. 2020. <span>“Cartogram: Create Cartograms with r.â€</span> <a href="https://CRAN.R-project.org/package=cartogram">https://CRAN.R-project.org/package=cartogram</a>. +</div> +<div id="ref-Lambert15" class="csl-entry" role="doc-biblioentry"> +Lambert, Nicolas. 2015. <span>“Les Anamorphoses Cartographiques.â€</span> Blog. <em>Carnet Néocartographique</em>. <a href="https://neocarto.hypotheses.org/366" class="uri">https://neocarto.hypotheses.org/366</a>. +</div> +<div id="ref-Olson76" class="csl-entry" role="doc-biblioentry"> +Olson, Judy M. 1976. <span>“Noncontiguous Area Cartograms.â€</span> <em>The Professional Geographer</em> 28 (4): 371–80. +</div> +<div id="ref-Paull16" class="csl-entry" role="doc-biblioentry"> +Paull, John, and Benjamin Hennig. 2016. <span>“Atlas of Organics: Four Maps of the World of Organic Agriculture.â€</span> <em>Journal of Organics</em> 3 (1): 25–32. +</div> +<div id="ref-tanaka1950" class="csl-entry" role="doc-biblioentry"> +Tanaka, Kitiro. 1950. <span>“The Relief Contour Method of Representing Topography on Maps.â€</span> <em>Geographical Review</em> 40 (3): 444. <a href="https://doi.org/10.2307/211219">https://doi.org/10.2307/211219</a>. +</div> +</div> +</section> +</section> + +</main> <!-- /main --> +<script id="quarto-html-after-body" type="application/javascript"> +window.document.addEventListener("DOMContentLoaded", function (event) { + const icon = ""; + const anchorJS = new window.AnchorJS(); + anchorJS.options = { + placement: 'right', + icon: icon + }; + anchorJS.add('.anchored'); + const clipboard = new window.ClipboardJS('.code-copy-button', { + target: function(trigger) { + return trigger.previousElementSibling; + } + }); + clipboard.on('success', function(e) { + // button target + const button = e.trigger; + // don't keep focus + button.blur(); + // flash "checked" + button.classList.add('code-copy-button-checked'); + var currentTitle = button.getAttribute("title"); + button.setAttribute("title", "Copied!"); + setTimeout(function() { + button.setAttribute("title", currentTitle); + button.classList.remove('code-copy-button-checked'); + }, 1000); + // clear code selection + e.clearSelection(); + }); + function tippyHover(el, contentFn) { + const config = { + allowHTML: true, + content: contentFn, + maxWidth: 500, + delay: 100, + arrow: false, + appendTo: function(el) { + return el.parentElement; + }, + interactive: true, + interactiveBorder: 10, + theme: 'quarto', + placement: 'bottom-start' + }; + window.tippy(el, config); + } + const noterefs = window.document.querySelectorAll('a[role="doc-noteref"]'); + for (var i=0; i<noterefs.length; i++) { + const ref = noterefs[i]; + tippyHover(ref, function() { + let href = ref.getAttribute('href'); + try { href = new URL(href).hash; } catch {} + const id = href.replace(/^#\/?/, ""); + const note = window.document.getElementById(id); + return note.innerHTML; + }); + } + var bibliorefs = window.document.querySelectorAll('a[role="doc-biblioref"]'); + for (var i=0; i<bibliorefs.length; i++) { + const ref = bibliorefs[i]; + const cites = ref.parentNode.getAttribute('data-cites').split(' '); + tippyHover(ref, function() { + var popup = window.document.createElement('div'); + cites.forEach(function(cite) { + var citeDiv = window.document.createElement('div'); + citeDiv.classList.add('hanging-indent'); + citeDiv.classList.add('csl-entry'); + var biblioDiv = window.document.getElementById('ref-' + cite); + if (biblioDiv) { + citeDiv.innerHTML = biblioDiv.innerHTML; + } + popup.appendChild(citeDiv); + }); + return popup.innerHTML; + }); + } + var localhostRegex = new RegExp(/^(?:http|https):\/\/localhost\:?[0-9]*\//); + var filterRegex = new RegExp('/' + window.location.host + '/'); + var isInternal = (href) => { + return filterRegex.test(href) || localhostRegex.test(href); + } + // Inspect non-navigation links and adorn them if external + var links = window.document.querySelectorAll('a:not(.nav-link):not(.navbar-brand):not(.toc-action):not(.sidebar-link):not(.sidebar-item-toggle):not(.pagination-link):not(.no-external)'); + for (var i=0; i<links.length; i++) { + const link = links[i]; + if (!isInternal(link.href)) { + // target, if specified + link.setAttribute("target", "_blank"); + } + } +}); +</script> +<nav class="page-navigation"> + <div class="nav-page nav-page-previous"> + <a href="./03-vector_data.html" class="pagination-link"> + <i class="bi bi-arrow-left-short"></i> <span class="nav-page-text"><span class="chapter-number">3</span> <span class="chapter-title">Vector Data</span></span> + </a> + </div> + <div class="nav-page nav-page-next"> + <a href="./references.html" class="pagination-link"> + <span class="nav-page-text">References</span> <i class="bi bi-arrow-right-short"></i> + </a> + </div> +</nav> +</div> <!-- /content --> +<footer class="footer"> + <div class="nav-footer"> + <div class="nav-footer-left">UMR 228 ESPACE-DEV</div> + <div class="nav-footer-right"><img src="img/ird_footer.png" height="50"></div> + </div> +</footer> + + + +</body></html> \ No newline at end of file diff --git a/public/05-mapping_with_r_files/figure-html/choro-1.png b/public/05-mapping_with_r_files/figure-html/choro-1.png new file mode 100644 index 0000000000000000000000000000000000000000..60eeecc8610aebdf1299f4972ef356212a003ff1 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/choro-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/choroprop-1.png b/public/05-mapping_with_r_files/figure-html/choroprop-1.png new file mode 100644 index 0000000000000000000000000000000000000000..039376ef9d0520ac28a1d4f4302f6133d793c453 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/choroprop-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/choropt-1.png b/public/05-mapping_with_r_files/figure-html/choropt-1.png new file mode 100644 index 0000000000000000000000000000000000000000..feb59025c27edc0445283cc13e6ee254f1eb420e Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/choropt-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/credit-1.png b/public/05-mapping_with_r_files/figure-html/credit-1.png new file mode 100644 index 0000000000000000000000000000000000000000..8128372463c3eb14c7bd0185e0c16bcb937d2d8f Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/credit-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/discr3-1.png b/public/05-mapping_with_r_files/figure-html/discr3-1.png new file mode 100644 index 0000000000000000000000000000000000000000..fabbcd1a680e706bf6938a2fd4696d345ab5ddbe Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/discr3-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/dorling-1.png b/public/05-mapping_with_r_files/figure-html/dorling-1.png new file mode 100644 index 0000000000000000000000000000000000000000..b0921901e68776cf8da68314794386a7ac34879b Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/dorling-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/dougenik-1.png b/public/05-mapping_with_r_files/figure-html/dougenik-1.png new file mode 100644 index 0000000000000000000000000000000000000000..203416c0675ef67e005324456fa300a0024526b6 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/dougenik-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/inset-1.png b/public/05-mapping_with_r_files/figure-html/inset-1.png new file mode 100644 index 0000000000000000000000000000000000000000..9867be911cd710496c494a5f0db2e962317a826d Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/inset-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/labs-1.png b/public/05-mapping_with_r_files/figure-html/labs-1.png new file mode 100644 index 0000000000000000000000000000000000000000..03c93384d8d4c7d56e16571fdf9135e8eca83cfb Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/labs-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/layout1-1.png b/public/05-mapping_with_r_files/figure-html/layout1-1.png new file mode 100644 index 0000000000000000000000000000000000000000..aa6fc76d9f2efdf85cbf947d2e5b099ebe36b30f Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/layout1-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/linemap-1.png b/public/05-mapping_with_r_files/figure-html/linemap-1.png new file mode 100644 index 0000000000000000000000000000000000000000..b0c2f2875c67521325493795f21695a07cf51257 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/linemap-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/logo-1.png b/public/05-mapping_with_r_files/figure-html/logo-1.png new file mode 100644 index 0000000000000000000000000000000000000000..e33ba26015db44ec82784f6de4b73b52d11e8601 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/logo-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/mf_base-1.png b/public/05-mapping_with_r_files/figure-html/mf_base-1.png new file mode 100644 index 0000000000000000000000000000000000000000..53b54fc7f72e63fa4a96c3c72d7d310b82005c69 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/mf_base-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/mfrow0-1.png b/public/05-mapping_with_r_files/figure-html/mfrow0-1.png new file mode 100644 index 0000000000000000000000000000000000000000..efb7c6973fe924365a9bee1a4eef0efcc229de1c Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/mfrow0-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/north-1.png b/public/05-mapping_with_r_files/figure-html/north-1.png new file mode 100644 index 0000000000000000000000000000000000000000..f5ebfab7e675e42c323c5887f10c48bf5a9654b5 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/north-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/olson-1.png b/public/05-mapping_with_r_files/figure-html/olson-1.png new file mode 100644 index 0000000000000000000000000000000000000000..b63433e78b40b90e49c39a7eb53fee5397cd8697 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/olson-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/pal1-1.png b/public/05-mapping_with_r_files/figure-html/pal1-1.png new file mode 100644 index 0000000000000000000000000000000000000000..cb14f9927e5d2022c200e778328b87509bb28ba1 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/pal1-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/pal2-1.png b/public/05-mapping_with_r_files/figure-html/pal2-1.png new file mode 100644 index 0000000000000000000000000000000000000000..241ac67b3607c70e5174afff41a4961dd4f37ddb Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/pal2-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/proportional_symbols-1.png b/public/05-mapping_with_r_files/figure-html/proportional_symbols-1.png new file mode 100644 index 0000000000000000000000000000000000000000..cd8834aafdd79c1f6ad81bc00b53f086690cf940 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/proportional_symbols-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/proportional_symbols_comp-1.png b/public/05-mapping_with_r_files/figure-html/proportional_symbols_comp-1.png new file mode 100644 index 0000000000000000000000000000000000000000..1015264903d0d96f77cecde4cae5f654288c28ff Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/proportional_symbols_comp-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/scale-1.png b/public/05-mapping_with_r_files/figure-html/scale-1.png new file mode 100644 index 0000000000000000000000000000000000000000..99b4f1b72150626c984dd5fb8869cd7e5c96e2c0 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/scale-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/shadow-1.png b/public/05-mapping_with_r_files/figure-html/shadow-1.png new file mode 100644 index 0000000000000000000000000000000000000000..5ab94a3897a4beeb6f2226a8e0f53c4f809a1f1e Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/shadow-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/tanaka-1.png b/public/05-mapping_with_r_files/figure-html/tanaka-1.png new file mode 100644 index 0000000000000000000000000000000000000000..e2754ca32b1a433b5b4484165e87b5712e77011e Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/tanaka-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/them1-1.png b/public/05-mapping_with_r_files/figure-html/them1-1.png new file mode 100644 index 0000000000000000000000000000000000000000..2cd909e95ef6f735f1731df6c9fb7b4439a6bd7d Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/them1-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/theme2-1.png b/public/05-mapping_with_r_files/figure-html/theme2-1.png new file mode 100644 index 0000000000000000000000000000000000000000..dd3a76149b0a1e3213a0bd18e37679cd687b2388 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/theme2-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/typo_order-1.png b/public/05-mapping_with_r_files/figure-html/typo_order-1.png new file mode 100644 index 0000000000000000000000000000000000000000..77b08ec3eace8b64c6bccd489d75f59bdbaecfe4 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/typo_order-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/typo_point-1.png b/public/05-mapping_with_r_files/figure-html/typo_point-1.png new file mode 100644 index 0000000000000000000000000000000000000000..621eceeb99d2e015aec81f3d7e3f48a237df5563 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/typo_point-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/typo_simple-1.png b/public/05-mapping_with_r_files/figure-html/typo_simple-1.png new file mode 100644 index 0000000000000000000000000000000000000000..7f392b5b355253487ab84e2d09088fa7515e986b Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/typo_simple-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/typoprop-1.png b/public/05-mapping_with_r_files/figure-html/typoprop-1.png new file mode 100644 index 0000000000000000000000000000000000000000..e2f3fff4f30833fddcbc7c3ab90518fc4f280079 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/typoprop-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/unnamed-chunk-2-1.png b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-2-1.png new file mode 100644 index 0000000000000000000000000000000000000000..9ddb967f45c3c44780baee9f432ca05a29313c43 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-2-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/unnamed-chunk-4-1.png b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-4-1.png new file mode 100644 index 0000000000000000000000000000000000000000..1ad207dbb08574b513d012e90a7046bfb80342ee Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-4-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/unnamed-chunk-5-1.png b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-5-1.png new file mode 100644 index 0000000000000000000000000000000000000000..6244cf64fdf5f14b5698a15cacd37a1d274849de Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-5-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/unnamed-chunk-6-1.png b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-6-1.png new file mode 100644 index 0000000000000000000000000000000000000000..fefeba35eb18edc884e54216d6377061b4ff0329 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-6-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/unnamed-chunk-7-1.png b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-7-1.png new file mode 100644 index 0000000000000000000000000000000000000000..1d7e0019fd76b4a88bacfe5eddf2b5d33a1a2e79 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-7-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/unnamed-chunk-8-1.png b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-8-1.png new file mode 100644 index 0000000000000000000000000000000000000000..749cca4c0e5779b216ff3e7c38eaa601ac5bd7f0 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-8-1.png differ diff --git a/public/05-mapping_with_r_files/figure-html/unnamed-chunk-9-1.png b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-9-1.png new file mode 100644 index 0000000000000000000000000000000000000000..79b8c8aafc57e4a2e1a6532cbe08a3cf3b0ea465 Binary files /dev/null and b/public/05-mapping_with_r_files/figure-html/unnamed-chunk-9-1.png differ diff --git a/public/img/cartogram.jpg b/public/img/cartogram.jpg new file mode 100644 index 0000000000000000000000000000000000000000..5eb5cdc1b9459d888e795790c9b20a323f164e80 Binary files /dev/null and b/public/img/cartogram.jpg differ diff --git a/public/img/dist_filter_1.png b/public/img/dist_filter_1.png new file mode 100644 index 0000000000000000000000000000000000000000..e11d04497a5dd79cb75c5f49140e6855f14397a7 Binary files /dev/null and b/public/img/dist_filter_1.png differ diff --git a/public/img/dist_filter_2.png b/public/img/dist_filter_2.png new file mode 100644 index 0000000000000000000000000000000000000000..a31388d9d9ce499fc265419d80913c158fa8e6fa Binary files /dev/null and b/public/img/dist_filter_2.png differ diff --git a/public/img/dorling.png b/public/img/dorling.png new file mode 100644 index 0000000000000000000000000000000000000000..26e49fa394993c1d747e3345a43a7fad43cebe4f Binary files /dev/null and b/public/img/dorling.png differ diff --git a/public/img/locator.webm b/public/img/locator.webm new file mode 100644 index 0000000000000000000000000000000000000000..5f6a2252f682d9f3c51ac719ebdbfdfa6c1f0ba5 Binary files /dev/null and b/public/img/locator.webm differ diff --git a/public/img/nccartogram.png b/public/img/nccartogram.png new file mode 100644 index 0000000000000000000000000000000000000000..ae2aaaf60ebb290320224e86f6320a85d9cf7591 Binary files /dev/null and b/public/img/nccartogram.png differ diff --git a/public/img/swatch-plot-1.svg b/public/img/swatch-plot-1.svg new file mode 100644 index 0000000000000000000000000000000000000000..6fbd46fa3641d644c4240d9e627e2279381dfcec --- /dev/null +++ b/public/img/swatch-plot-1.svg @@ -0,0 +1,1736 @@ +<?xml version="1.0" encoding="UTF-8"?> +<svg xmlns="http://www.w3.org/2000/svg" xmlns:xlink="http://www.w3.org/1999/xlink" width="705pt" height="648pt" viewBox="0 0 705 648" version="1.1"> +<defs> +<g> +<symbol overflow="visible" id="glyph0-0"> +<path style="stroke:none;" d=""/> +</symbol> +<symbol overflow="visible" id="glyph0-1"> +<path style="stroke:none;" d="M 1.546875 -2.59375 L 3.46875 -2.59375 C 3.953125 -2.59375 4.328125 -2.734375 4.65625 -3.03125 C 5.03125 -3.375 5.1875 -3.765625 5.1875 -4.328125 C 5.1875 -5.484375 4.5 -6.125 3.296875 -6.125 L 0.765625 -6.125 L 0.765625 0 L 1.546875 0 Z M 1.546875 -3.28125 L 1.546875 -5.4375 L 3.171875 -5.4375 C 3.921875 -5.4375 4.375 -5.03125 4.375 -4.359375 C 4.375 -3.6875 3.921875 -3.28125 3.171875 -3.28125 Z M 1.546875 -3.28125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-2"> +<path style="stroke:none;" d="M 4.5 -0.40625 C 4.421875 -0.390625 4.390625 -0.390625 4.34375 -0.390625 C 4.109375 -0.390625 3.96875 -0.515625 3.96875 -0.734375 L 3.96875 -3.328125 C 3.96875 -4.109375 3.390625 -4.53125 2.3125 -4.53125 C 1.671875 -4.53125 1.15625 -4.34375 0.84375 -4.015625 C 0.640625 -3.796875 0.5625 -3.53125 0.546875 -3.109375 L 1.25 -3.109375 C 1.3125 -3.640625 1.625 -3.890625 2.28125 -3.890625 C 2.921875 -3.890625 3.265625 -3.640625 3.265625 -3.234375 L 3.265625 -3.046875 C 3.265625 -2.734375 3.109375 -2.625 2.53125 -2.5625 C 1.546875 -2.421875 1.390625 -2.390625 1.125 -2.28125 C 0.609375 -2.0625 0.359375 -1.6875 0.359375 -1.109375 C 0.359375 -0.3125 0.90625 0.1875 1.796875 0.1875 C 2.359375 0.1875 2.796875 0 3.296875 -0.453125 C 3.34375 0 3.5625 0.1875 4.015625 0.1875 C 4.171875 0.1875 4.265625 0.171875 4.5 0.125 Z M 3.265625 -1.390625 C 3.265625 -1.15625 3.203125 -1.015625 3 -0.8125 C 2.703125 -0.5625 2.359375 -0.421875 1.953125 -0.421875 C 1.40625 -0.421875 1.078125 -0.6875 1.078125 -1.125 C 1.078125 -1.59375 1.390625 -1.828125 2.140625 -1.9375 C 2.890625 -2.03125 3.03125 -2.0625 3.265625 -2.171875 Z M 3.265625 -1.390625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-3"> +<path style="stroke:none;" d="M 3.6875 -3.171875 C 3.671875 -4.046875 3.109375 -4.53125 2.078125 -4.53125 C 1.0625 -4.53125 0.390625 -4 0.390625 -3.1875 C 0.390625 -2.5 0.75 -2.171875 1.796875 -1.921875 L 2.453125 -1.75 C 2.9375 -1.640625 3.125 -1.46875 3.125 -1.15625 C 3.125 -0.734375 2.71875 -0.453125 2.09375 -0.453125 C 1.71875 -0.453125 1.40625 -0.5625 1.234375 -0.75 C 1.125 -0.875 1.0625 -1 1.03125 -1.3125 L 0.28125 -1.3125 C 0.3125 -0.296875 0.890625 0.1875 2.046875 0.1875 C 3.15625 0.1875 3.859375 -0.359375 3.859375 -1.203125 C 3.859375 -1.859375 3.484375 -2.21875 2.609375 -2.421875 L 1.9375 -2.59375 C 1.375 -2.71875 1.125 -2.90625 1.125 -3.21875 C 1.125 -3.625 1.484375 -3.890625 2.0625 -3.890625 C 2.625 -3.890625 2.921875 -3.640625 2.9375 -3.171875 Z M 3.6875 -3.171875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-4"> +<path style="stroke:none;" d="M 2.140625 -4.40625 L 1.40625 -4.40625 L 1.40625 -5.609375 L 0.71875 -5.609375 L 0.71875 -4.40625 L 0.125 -4.40625 L 0.125 -3.828125 L 0.71875 -3.828125 L 0.71875 -0.5 C 0.71875 -0.046875 1.015625 0.1875 1.5625 0.1875 C 1.75 0.1875 1.90625 0.171875 2.140625 0.140625 L 2.140625 -0.453125 C 2.03125 -0.421875 1.9375 -0.421875 1.796875 -0.421875 C 1.5 -0.421875 1.40625 -0.5 1.40625 -0.8125 L 1.40625 -3.828125 L 2.140625 -3.828125 Z M 2.140625 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-5"> +<path style="stroke:none;" d="M 4.3125 -1.96875 C 4.3125 -2.640625 4.265625 -3.046875 4.140625 -3.375 C 3.84375 -4.09375 3.171875 -4.53125 2.359375 -4.53125 C 1.125 -4.53125 0.34375 -3.59375 0.34375 -2.140625 C 0.34375 -0.6875 1.09375 0.1875 2.34375 0.1875 C 3.34375 0.1875 4.046875 -0.375 4.21875 -1.34375 L 3.515625 -1.34375 C 3.328125 -0.75 2.921875 -0.453125 2.359375 -0.453125 C 1.921875 -0.453125 1.53125 -0.65625 1.296875 -1.03125 C 1.140625 -1.28125 1.078125 -1.53125 1.0625 -1.96875 Z M 1.078125 -2.53125 C 1.140625 -3.359375 1.640625 -3.890625 2.34375 -3.890625 C 3.0625 -3.890625 3.5625 -3.328125 3.5625 -2.53125 Z M 1.078125 -2.53125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-6"> +<path style="stroke:none;" d="M 1.28125 -6.125 L 0.578125 -6.125 L 0.578125 0 L 1.28125 0 Z M 1.28125 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-7"> +<path style="stroke:none;" d=""/> +</symbol> +<symbol overflow="visible" id="glyph0-8"> +<path style="stroke:none;" d="M 2.171875 -4.328125 L 2.171875 0 L 2.921875 0 L 2.921875 -6.078125 L 2.421875 -6.078125 C 2.171875 -5.140625 2 -5.015625 0.859375 -4.859375 L 0.859375 -4.328125 Z M 2.171875 -4.328125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-9"> +<path style="stroke:none;" d="M 0.75 0 L 3.109375 0 C 4.65625 0 5.609375 -1.15625 5.609375 -3.0625 C 5.609375 -4.96875 4.671875 -6.125 3.109375 -6.125 L 0.75 -6.125 Z M 1.53125 -0.6875 L 1.53125 -5.4375 L 2.96875 -5.4375 C 4.1875 -5.4375 4.828125 -4.625 4.828125 -3.0625 C 4.828125 -1.5 4.1875 -0.6875 2.96875 -0.6875 Z M 1.53125 -0.6875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-10"> +<path style="stroke:none;" d="M 0.578125 -4.40625 L 0.578125 0 L 1.28125 0 L 1.28125 -2.28125 C 1.296875 -3.34375 1.734375 -3.8125 2.703125 -3.796875 L 2.703125 -4.5 C 2.578125 -4.515625 2.515625 -4.53125 2.421875 -4.53125 C 1.96875 -4.53125 1.625 -4.265625 1.234375 -3.609375 L 1.234375 -4.40625 Z M 0.578125 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-11"> +<path style="stroke:none;" d="M 1.1875 -6.125 L 0.484375 -6.125 L 0.484375 0 L 1.1875 0 L 1.1875 -1.71875 L 1.859375 -2.390625 L 3.359375 0 L 4.21875 0 L 2.421875 -2.890625 L 3.953125 -4.40625 L 3.046875 -4.40625 L 1.1875 -2.53125 Z M 1.1875 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-12"> +<path style="stroke:none;" d="M 4.25 -0.734375 L 1.125 -0.734375 C 1.1875 -1.234375 1.46875 -1.5625 2.1875 -2 L 3.03125 -2.46875 C 3.859375 -2.9375 4.296875 -3.5625 4.296875 -4.296875 C 4.296875 -4.8125 4.09375 -5.28125 3.734375 -5.609375 C 3.390625 -5.921875 2.953125 -6.078125 2.390625 -6.078125 C 1.625 -6.078125 1.0625 -5.8125 0.734375 -5.28125 C 0.53125 -4.96875 0.4375 -4.59375 0.421875 -3.96875 L 1.15625 -3.96875 C 1.1875 -4.390625 1.234375 -4.625 1.34375 -4.828125 C 1.53125 -5.203125 1.921875 -5.4375 2.359375 -5.4375 C 3.03125 -5.4375 3.53125 -4.9375 3.53125 -4.28125 C 3.53125 -3.796875 3.265625 -3.375 2.734375 -3.078125 L 1.953125 -2.625 C 0.71875 -1.90625 0.359375 -1.34375 0.28125 -0.015625 L 4.25 -0.015625 Z M 4.25 -0.734375 "/> +</symbol> +<symbol overflow="visible" id="glyph0-13"> +<path style="stroke:none;" d="M 1.859375 -2.796875 L 2.265625 -2.796875 C 3.0625 -2.796875 3.5 -2.421875 3.5 -1.6875 C 3.5 -0.921875 3.03125 -0.46875 2.265625 -0.46875 C 1.453125 -0.46875 1.0625 -0.875 1.015625 -1.765625 L 0.265625 -1.765625 C 0.296875 -1.28125 0.390625 -0.953125 0.53125 -0.6875 C 0.84375 -0.09375 1.421875 0.1875 2.234375 0.1875 C 3.46875 0.1875 4.25 -0.546875 4.25 -1.703125 C 4.25 -2.46875 3.953125 -2.890625 3.25 -3.140625 C 3.796875 -3.375 4.078125 -3.796875 4.078125 -4.40625 C 4.078125 -5.453125 3.390625 -6.078125 2.265625 -6.078125 C 1.0625 -6.078125 0.421875 -5.40625 0.390625 -4.125 L 1.140625 -4.125 C 1.140625 -4.484375 1.171875 -4.703125 1.265625 -4.890625 C 1.4375 -5.234375 1.8125 -5.4375 2.265625 -5.4375 C 2.921875 -5.4375 3.328125 -5.03125 3.328125 -4.375 C 3.328125 -3.953125 3.171875 -3.6875 2.84375 -3.546875 C 2.640625 -3.46875 2.375 -3.4375 1.859375 -3.421875 Z M 1.859375 -2.796875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-14"> +<path style="stroke:none;" d="M 5.015625 -4.328125 C 5.015625 -4.75 4.984375 -4.859375 4.84375 -5.15625 C 4.515625 -5.859375 3.796875 -6.234375 2.765625 -6.234375 C 1.421875 -6.234375 0.59375 -5.546875 0.59375 -4.4375 C 0.59375 -3.6875 0.984375 -3.21875 1.796875 -3 L 3.3125 -2.59375 C 4.09375 -2.390625 4.4375 -2.078125 4.4375 -1.609375 C 4.4375 -1.28125 4.265625 -0.9375 4 -0.75 C 3.75 -0.578125 3.375 -0.5 2.875 -0.5 C 2.203125 -0.5 1.75 -0.65625 1.46875 -1.015625 C 1.234375 -1.28125 1.140625 -1.578125 1.140625 -1.953125 L 0.40625 -1.953125 C 0.40625 -1.390625 0.515625 -1.015625 0.765625 -0.6875 C 1.1875 -0.09375 1.890625 0.1875 2.828125 0.1875 C 3.5625 0.1875 4.15625 0.03125 4.546875 -0.28125 C 4.953125 -0.609375 5.21875 -1.15625 5.21875 -1.6875 C 5.21875 -2.4375 4.75 -3 3.921875 -3.21875 L 2.375 -3.625 C 1.640625 -3.828125 1.375 -4.0625 1.375 -4.546875 C 1.375 -5.15625 1.921875 -5.578125 2.734375 -5.578125 C 3.71875 -5.578125 4.265625 -5.140625 4.265625 -4.328125 Z M 5.015625 -4.328125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-15"> +<path style="stroke:none;" d="M 6.25 0 L 7.8125 -6.125 L 6.9375 -6.125 L 5.8125 -1.15625 L 4.40625 -6.125 L 3.578125 -6.125 L 2.203125 -1.15625 L 1.0625 -6.125 L 0.1875 -6.125 L 1.75 0 L 2.609375 0 L 3.984375 -5.03125 L 5.390625 0 Z M 6.25 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-16"> +<path style="stroke:none;" d="M 0.59375 -4.40625 L 0.59375 0 L 1.296875 0 L 1.296875 -2.765625 C 1.296875 -3.40625 1.75 -3.921875 2.328125 -3.921875 C 2.84375 -3.921875 3.140625 -3.59375 3.140625 -3.03125 L 3.140625 0 L 3.84375 0 L 3.84375 -2.765625 C 3.84375 -3.40625 4.3125 -3.921875 4.890625 -3.921875 C 5.390625 -3.921875 5.703125 -3.59375 5.703125 -3.03125 L 5.703125 0 L 6.40625 0 L 6.40625 -3.296875 C 6.40625 -4.09375 5.953125 -4.53125 5.125 -4.53125 C 4.546875 -4.53125 4.1875 -4.359375 3.78125 -3.859375 C 3.515625 -4.328125 3.15625 -4.53125 2.59375 -4.53125 C 2 -4.53125 1.609375 -4.3125 1.234375 -3.78125 L 1.234375 -4.40625 Z M 0.59375 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-17"> +<path style="stroke:none;" d="M 5.5625 -4.234375 C 5.328125 -5.578125 4.546875 -6.234375 3.203125 -6.234375 C 2.375 -6.234375 1.71875 -5.96875 1.265625 -5.46875 C 0.703125 -4.859375 0.40625 -3.984375 0.40625 -3 C 0.40625 -1.984375 0.71875 -1.125 1.28125 -0.515625 C 1.765625 -0.03125 2.375 0.1875 3.171875 0.1875 C 4.671875 0.1875 5.5 -0.609375 5.6875 -2.234375 L 4.890625 -2.234375 C 4.8125 -1.8125 4.734375 -1.53125 4.609375 -1.28125 C 4.359375 -0.78125 3.828125 -0.5 3.171875 -0.5 C 1.953125 -0.5 1.1875 -1.46875 1.1875 -3 C 1.1875 -4.578125 1.921875 -5.546875 3.109375 -5.546875 C 3.609375 -5.546875 4.0625 -5.390625 4.328125 -5.15625 C 4.546875 -4.9375 4.671875 -4.6875 4.765625 -4.234375 Z M 5.5625 -4.234375 "/> +</symbol> +<symbol overflow="visible" id="glyph0-18"> +<path style="stroke:none;" d="M 2.28125 -4.53125 C 1.046875 -4.53125 0.296875 -3.640625 0.296875 -2.171875 C 0.296875 -0.6875 1.046875 0.1875 2.296875 0.1875 C 3.53125 0.1875 4.28125 -0.6875 4.28125 -2.140625 C 4.28125 -3.671875 3.5625 -4.53125 2.28125 -4.53125 Z M 2.296875 -3.890625 C 3.078125 -3.890625 3.5625 -3.234375 3.5625 -2.140625 C 3.5625 -1.09375 3.0625 -0.453125 2.296875 -0.453125 C 1.515625 -0.453125 1.03125 -1.09375 1.03125 -2.171875 C 1.03125 -3.234375 1.515625 -3.890625 2.296875 -3.890625 Z M 2.296875 -3.890625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-19"> +<path style="stroke:none;" d="M 4.15625 -6.125 L 3.46875 -6.125 L 3.46875 -3.84375 C 3.171875 -4.296875 2.703125 -4.53125 2.109375 -4.53125 C 0.96875 -4.53125 0.21875 -3.609375 0.21875 -2.203125 C 0.21875 -0.71875 0.9375 0.1875 2.140625 0.1875 C 2.734375 0.1875 3.15625 -0.03125 3.53125 -0.578125 L 3.53125 0 L 4.15625 0 Z M 2.234375 -3.875 C 2.984375 -3.875 3.46875 -3.21875 3.46875 -2.15625 C 3.46875 -1.140625 2.96875 -0.46875 2.234375 -0.46875 C 1.46875 -0.46875 0.953125 -1.140625 0.953125 -2.171875 C 0.953125 -3.1875 1.46875 -3.875 2.234375 -3.875 Z M 2.234375 -3.875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-20"> +<path style="stroke:none;" d="M 4.625 -2.796875 L 4.625 0 L 5.40625 0 L 5.40625 -6.125 L 4.625 -6.125 L 4.625 -3.484375 L 1.484375 -3.484375 L 1.484375 -6.125 L 0.703125 -6.125 L 0.703125 0 L 1.484375 0 L 1.484375 -2.796875 Z M 4.625 -2.796875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-21"> +<path style="stroke:none;" d="M 0.59375 -4.40625 L 0.59375 0 L 1.296875 0 L 1.296875 -2.421875 C 1.296875 -3.328125 1.765625 -3.921875 2.484375 -3.921875 C 3.046875 -3.921875 3.390625 -3.578125 3.390625 -3.046875 L 3.390625 0 L 4.09375 0 L 4.09375 -3.328125 C 4.09375 -4.0625 3.546875 -4.53125 2.703125 -4.53125 C 2.046875 -4.53125 1.625 -4.28125 1.234375 -3.671875 L 1.234375 -4.40625 Z M 0.59375 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-22"> +<path style="stroke:none;" d="M 1.265625 -4.40625 L 0.5625 -4.40625 L 0.5625 0 L 1.265625 0 Z M 1.265625 -6.125 L 0.5625 -6.125 L 0.5625 -5.25 L 1.265625 -5.25 Z M 1.265625 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-23"> +<path style="stroke:none;" d="M 3.953125 -2.921875 C 3.921875 -3.359375 3.828125 -3.625 3.671875 -3.875 C 3.359375 -4.28125 2.828125 -4.53125 2.21875 -4.53125 C 1.03125 -4.53125 0.265625 -3.59375 0.265625 -2.125 C 0.265625 -0.703125 1.015625 0.1875 2.203125 0.1875 C 3.265625 0.1875 3.921875 -0.4375 4.015625 -1.515625 L 3.296875 -1.515625 C 3.1875 -0.8125 2.828125 -0.453125 2.234375 -0.453125 C 1.453125 -0.453125 0.984375 -1.078125 0.984375 -2.125 C 0.984375 -3.234375 1.453125 -3.890625 2.203125 -3.890625 C 2.796875 -3.890625 3.171875 -3.53125 3.25 -2.921875 Z M 3.953125 -2.921875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-24"> +<path style="stroke:none;" d="M 3.265625 -4.40625 L 2.046875 -0.96875 L 0.921875 -4.40625 L 0.171875 -4.40625 L 1.65625 0.015625 L 1.390625 0.71875 C 1.265625 1.03125 1.125 1.140625 0.828125 1.140625 C 0.703125 1.140625 0.609375 1.125 0.453125 1.09375 L 0.453125 1.71875 C 0.59375 1.796875 0.734375 1.828125 0.921875 1.828125 C 1.15625 1.828125 1.390625 1.75 1.578125 1.625 C 1.796875 1.46875 1.921875 1.28125 2.0625 0.921875 L 4.015625 -4.40625 Z M 3.265625 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-25"> +<path style="stroke:none;" d="M 5.953125 -3.234375 L 3.40625 -3.234375 L 3.40625 -2.546875 L 5.265625 -2.546875 L 5.265625 -2.375 C 5.265625 -1.28125 4.46875 -0.5 3.34375 -0.5 C 2.71875 -0.5 2.15625 -0.71875 1.796875 -1.125 C 1.390625 -1.5625 1.15625 -2.28125 1.15625 -3.046875 C 1.15625 -4.546875 2.015625 -5.546875 3.296875 -5.546875 C 4.234375 -5.546875 4.90625 -5.0625 5.078125 -4.265625 L 5.875 -4.265625 C 5.65625 -5.515625 4.71875 -6.234375 3.3125 -6.234375 C 2.5625 -6.234375 1.953125 -6.03125 1.484375 -5.640625 C 0.765625 -5.046875 0.375 -4.109375 0.375 -3 C 0.375 -1.125 1.515625 0.1875 3.171875 0.1875 C 4.015625 0.1875 4.671875 -0.125 5.265625 -0.78125 L 5.46875 0.03125 L 5.953125 0.03125 Z M 5.953125 -3.234375 "/> +</symbol> +<symbol overflow="visible" id="glyph0-26"> +<path style="stroke:none;" d="M 1.453125 -6.125 L 0.671875 -6.125 L 0.671875 0 L 4.484375 0 L 4.484375 -0.6875 L 1.453125 -0.6875 Z M 1.453125 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-27"> +<path style="stroke:none;" d="M 3.390625 -4.40625 L 3.390625 -3.765625 C 3.046875 -4.296875 2.65625 -4.53125 2.09375 -4.53125 C 1.03125 -4.53125 0.296875 -3.53125 0.296875 -2.125 C 0.296875 -1.390625 0.46875 -0.84375 0.84375 -0.40625 C 1.171875 -0.015625 1.59375 0.1875 2.046875 0.1875 C 2.578125 0.1875 2.953125 -0.046875 3.328125 -0.59375 L 3.328125 -0.375 C 3.328125 0.8125 3 1.25 2.125 1.25 C 1.53125 1.25 1.21875 1.015625 1.15625 0.5 L 0.4375 0.5 C 0.5 1.3125 1.15625 1.828125 2.109375 1.828125 C 2.75 1.828125 3.296875 1.625 3.578125 1.265625 C 3.921875 0.859375 4.046875 0.3125 4.046875 -0.71875 L 4.046875 -4.40625 Z M 2.171875 -3.890625 C 2.90625 -3.890625 3.328125 -3.265625 3.328125 -2.140625 C 3.328125 -1.078125 2.90625 -0.453125 2.171875 -0.453125 C 1.453125 -0.453125 1.03125 -1.078125 1.03125 -2.171875 C 1.03125 -3.25 1.453125 -3.890625 2.171875 -3.890625 Z M 2.171875 -3.890625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-28"> +<path style="stroke:none;" d="M 0.59375 -6.125 L 0.59375 0 L 1.28125 0 L 1.28125 -2.421875 C 1.28125 -3.328125 1.75 -3.921875 2.484375 -3.921875 C 2.71875 -3.921875 2.9375 -3.84375 3.109375 -3.71875 C 3.296875 -3.578125 3.390625 -3.359375 3.390625 -3.046875 L 3.390625 0 L 4.078125 0 L 4.078125 -3.328125 C 4.078125 -4.0625 3.5625 -4.53125 2.703125 -4.53125 C 2.078125 -4.53125 1.703125 -4.34375 1.28125 -3.796875 L 1.28125 -6.125 Z M 0.59375 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-29"> +<path style="stroke:none;" d="M 0.671875 0 L 3.4375 0 C 4.015625 0 4.4375 -0.15625 4.765625 -0.515625 C 5.0625 -0.828125 5.234375 -1.265625 5.234375 -1.75 C 5.234375 -2.484375 4.90625 -2.9375 4.125 -3.234375 C 4.6875 -3.5 4.96875 -3.9375 4.96875 -4.578125 C 4.96875 -5.03125 4.796875 -5.40625 4.484375 -5.703125 C 4.15625 -6 3.734375 -6.125 3.15625 -6.125 L 0.671875 -6.125 Z M 1.453125 -3.484375 L 1.453125 -5.4375 L 2.953125 -5.4375 C 3.390625 -5.4375 3.640625 -5.375 3.84375 -5.21875 C 4.0625 -5.046875 4.1875 -4.796875 4.1875 -4.46875 C 4.1875 -4.125 4.0625 -3.875 3.84375 -3.703125 C 3.640625 -3.546875 3.390625 -3.484375 2.953125 -3.484375 Z M 1.453125 -0.6875 L 1.453125 -2.796875 L 3.359375 -2.796875 C 4.046875 -2.796875 4.453125 -2.40625 4.453125 -1.734375 C 4.453125 -1.078125 4.046875 -0.6875 3.359375 -0.6875 Z M 1.453125 -0.6875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-30"> +<path style="stroke:none;" d="M 4.046875 0 L 4.046875 -4.40625 L 3.359375 -4.40625 L 3.359375 -1.90625 C 3.359375 -1.015625 2.890625 -0.421875 2.15625 -0.421875 C 1.59375 -0.421875 1.25 -0.75 1.25 -1.28125 L 1.25 -4.40625 L 0.546875 -4.40625 L 0.546875 -1.015625 C 0.546875 -0.28125 1.09375 0.1875 1.953125 0.1875 C 2.59375 0.1875 3.015625 -0.03125 3.421875 -0.609375 L 3.421875 0 Z M 4.046875 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-31"> +<path style="stroke:none;" d="M 0.453125 1.828125 L 1.15625 1.828125 L 1.15625 -0.46875 C 1.53125 -0.015625 1.9375 0.1875 2.515625 0.1875 C 3.65625 0.1875 4.390625 -0.71875 4.390625 -2.125 C 4.390625 -3.609375 3.671875 -4.53125 2.5 -4.53125 C 1.90625 -4.53125 1.421875 -4.265625 1.09375 -3.734375 L 1.09375 -4.40625 L 0.453125 -4.40625 Z M 2.390625 -3.875 C 3.15625 -3.875 3.671875 -3.1875 3.671875 -2.140625 C 3.671875 -1.140625 3.15625 -0.46875 2.390625 -0.46875 C 1.640625 -0.46875 1.15625 -1.140625 1.15625 -2.171875 C 1.15625 -3.203125 1.640625 -3.875 2.390625 -3.875 Z M 2.390625 -3.875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-32"> +<path style="stroke:none;" d="M 1.5625 -2.640625 L 3.578125 -2.640625 C 4.28125 -2.640625 4.59375 -2.296875 4.59375 -1.546875 L 4.578125 -1 C 4.578125 -0.625 4.65625 -0.25 4.765625 0 L 5.703125 0 L 5.703125 -0.1875 C 5.40625 -0.390625 5.359375 -0.609375 5.34375 -1.421875 C 5.328125 -2.4375 5.171875 -2.734375 4.5 -3.03125 C 5.1875 -3.375 5.46875 -3.78125 5.46875 -4.484375 C 5.46875 -5.546875 4.8125 -6.125 3.609375 -6.125 L 0.78125 -6.125 L 0.78125 0 L 1.5625 0 Z M 1.5625 -3.328125 L 1.5625 -5.4375 L 3.453125 -5.4375 C 3.890625 -5.4375 4.140625 -5.375 4.34375 -5.203125 C 4.546875 -5.03125 4.65625 -4.75 4.65625 -4.390625 C 4.65625 -3.65625 4.28125 -3.328125 3.453125 -3.328125 Z M 1.5625 -3.328125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-33"> +<path style="stroke:none;" d="M 3.265625 -6.234375 C 1.515625 -6.234375 0.3125 -4.9375 0.3125 -3.015625 C 0.3125 -1.09375 1.5 0.1875 3.28125 0.1875 C 4.03125 0.1875 4.6875 -0.03125 5.171875 -0.453125 C 5.84375 -1.015625 6.234375 -1.96875 6.234375 -2.96875 C 6.234375 -4.9375 5.0625 -6.234375 3.265625 -6.234375 Z M 3.265625 -5.546875 C 4.59375 -5.546875 5.453125 -4.546875 5.453125 -2.984375 C 5.453125 -1.5 4.578125 -0.5 3.28125 -0.5 C 1.96875 -0.5 1.09375 -1.5 1.09375 -3.015625 C 1.09375 -4.53125 1.96875 -5.546875 3.265625 -5.546875 Z M 3.265625 -5.546875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-34"> +<path style="stroke:none;" d="M 2.390625 -2.625 L 0.390625 -2.625 L 0.390625 -2.015625 L 2.390625 -2.015625 Z M 2.390625 -2.625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-35"> +<path style="stroke:none;" d="M 3.25 -2.40625 L 5.5625 -6.125 L 4.625 -6.125 L 2.875 -3.140625 L 1.078125 -6.125 L 0.109375 -6.125 L 2.46875 -2.40625 L 2.46875 0 L 3.25 0 Z M 3.25 -2.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-36"> +<path style="stroke:none;" d="M 4.65625 0 L 5.953125 -4.40625 L 5.15625 -4.40625 L 4.28125 -0.96875 L 3.421875 -4.40625 L 2.5625 -4.40625 L 1.71875 -0.96875 L 0.828125 -4.40625 L 0.046875 -4.40625 L 1.328125 0 L 2.125 0 L 2.96875 -3.453125 L 3.859375 0 Z M 4.65625 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-37"> +<path style="stroke:none;" d="M 2.96875 -5.4375 L 4.984375 -5.4375 L 4.984375 -6.125 L 0.171875 -6.125 L 0.171875 -5.4375 L 2.1875 -5.4375 L 2.1875 0 L 2.96875 0 Z M 2.96875 -5.4375 "/> +</symbol> +<symbol overflow="visible" id="glyph0-38"> +<path style="stroke:none;" d="M 3.296875 0 L 5.421875 -6.125 L 4.59375 -6.125 L 2.890625 -0.9375 L 1.09375 -6.125 L 0.25 -6.125 L 2.453125 0 Z M 3.296875 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-39"> +<path style="stroke:none;" d="M 1.625 -6.125 L 0.84375 -6.125 L 0.84375 0 L 1.625 0 Z M 1.625 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-40"> +<path style="stroke:none;" d="M 2.171875 -4.40625 L 1.4375 -4.40625 L 1.4375 -5.09375 C 1.4375 -5.390625 1.59375 -5.546875 1.921875 -5.546875 C 1.984375 -5.546875 2.015625 -5.546875 2.171875 -5.53125 L 2.171875 -6.109375 C 2.015625 -6.140625 1.921875 -6.15625 1.78125 -6.15625 C 1.125 -6.15625 0.734375 -5.78125 0.734375 -5.15625 L 0.734375 -4.40625 L 0.15625 -4.40625 L 0.15625 -3.828125 L 0.734375 -3.828125 L 0.734375 0 L 1.4375 0 L 1.4375 -3.828125 L 2.171875 -3.828125 Z M 2.171875 -4.40625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-41"> +<path style="stroke:none;" d="M 3.9375 0 L 5.65625 -5.140625 L 5.65625 0 L 6.390625 0 L 6.390625 -6.125 L 5.3125 -6.125 L 3.53125 -0.796875 L 1.71875 -6.125 L 0.625 -6.125 L 0.625 0 L 1.375 0 L 1.375 -5.140625 L 3.109375 0 Z M 3.9375 0 "/> +</symbol> +<symbol overflow="visible" id="glyph0-42"> +<path style="stroke:none;" d="M 1.53125 -2.796875 L 4.875 -2.796875 L 4.875 -3.484375 L 1.53125 -3.484375 L 1.53125 -5.4375 L 5 -5.4375 L 5 -6.125 L 0.75 -6.125 L 0.75 0 L 5.15625 0 L 5.15625 -0.6875 L 1.53125 -0.6875 Z M 1.53125 -2.796875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-43"> +<path style="stroke:none;" d="M 4.859375 1.0625 L -0.1875 1.0625 L -0.1875 1.484375 L 4.859375 1.484375 Z M 4.859375 1.0625 "/> +</symbol> +<symbol overflow="visible" id="glyph0-44"> +<path style="stroke:none;" d="M 0.59375 -4.40625 L 0.59375 0.640625 C 0.59375 1.078125 0.453125 1.21875 0.015625 1.21875 C -0.03125 1.21875 -0.0625 1.21875 -0.15625 1.203125 L -0.15625 1.8125 C -0.0625 1.828125 -0.03125 1.828125 0.078125 1.828125 C 0.875 1.828125 1.28125 1.515625 1.28125 0.921875 L 1.28125 -4.40625 Z M 1.28125 -6.125 L 0.59375 -6.125 L 0.59375 -5.25 L 1.28125 -5.25 Z M 1.28125 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-45"> +<path style="stroke:none;" d="M 0.453125 -6.125 L 0.453125 0 L 1.078125 0 L 1.078125 -0.5625 C 1.421875 -0.046875 1.859375 0.1875 2.484375 0.1875 C 3.640625 0.1875 4.390625 -0.75 4.390625 -2.21875 C 4.390625 -3.640625 3.6875 -4.53125 2.515625 -4.53125 C 1.90625 -4.53125 1.484375 -4.296875 1.15625 -3.8125 L 1.15625 -6.125 Z M 2.375 -3.875 C 3.15625 -3.875 3.671875 -3.1875 3.671875 -2.140625 C 3.671875 -1.140625 3.140625 -0.46875 2.375 -0.46875 C 1.625 -0.46875 1.15625 -1.140625 1.15625 -2.171875 C 1.15625 -3.203125 1.625 -3.875 2.375 -3.875 Z M 2.375 -3.875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-46"> +<path style="stroke:none;" d="M 2.125 -4.40625 L 1.390625 -4.40625 L 1.390625 -5.09375 C 1.390625 -5.390625 1.546875 -5.546875 1.875 -5.546875 C 1.9375 -5.546875 1.953125 -5.546875 2.125 -5.53125 L 2.125 -6.109375 C 1.953125 -6.140625 1.859375 -6.15625 1.71875 -6.15625 C 1.078125 -6.15625 0.6875 -5.78125 0.6875 -5.15625 L 0.6875 -4.40625 L 0.09375 -4.40625 L 0.09375 -3.828125 L 0.6875 -3.828125 L 0.6875 0 L 1.390625 0 L 1.390625 -3.828125 L 2.125 -3.828125 Z M 3.671875 -4.40625 L 2.96875 -4.40625 L 2.96875 0 L 3.671875 0 Z M 3.671875 -6.125 L 2.96875 -6.125 L 2.96875 -5.25 L 3.671875 -5.25 Z M 3.671875 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-47"> +<path style="stroke:none;" d="M 3.984375 -1.84375 L 4.609375 0 L 5.484375 0 L 3.34375 -6.125 L 2.328125 -6.125 L 0.140625 0 L 0.96875 0 L 1.625 -1.84375 Z M 3.765625 -2.5 L 1.8125 -2.5 L 2.828125 -5.28125 Z M 3.765625 -2.5 "/> +</symbol> +<symbol overflow="visible" id="glyph0-48"> +<path style="stroke:none;" d="M 1.53125 -2.796875 L 4.46875 -2.796875 L 4.46875 -3.484375 L 1.53125 -3.484375 L 1.53125 -5.4375 L 4.859375 -5.4375 L 4.859375 -6.125 L 0.75 -6.125 L 0.75 0 L 1.53125 0 Z M 1.53125 -2.796875 "/> +</symbol> +<symbol overflow="visible" id="glyph0-49"> +<path style="stroke:none;" d="M 4.890625 -6.125 L 0.46875 -6.125 L 0.46875 -5.4375 L 3.921875 -5.4375 L 0.234375 -0.6875 L 0.234375 0 L 4.90625 0 L 4.90625 -0.6875 L 1.21875 -0.6875 L 4.890625 -5.421875 Z M 4.890625 -6.125 "/> +</symbol> +<symbol overflow="visible" id="glyph0-50"> +<path style="stroke:none;" d="M 2.390625 0 L 4.078125 -4.40625 L 3.296875 -4.40625 L 2.046875 -0.828125 L 0.875 -4.40625 L 0.078125 -4.40625 L 1.625 0 Z M 2.390625 0 "/> +</symbol> +</g> +</defs> +<g id="surface7"> +<rect x="0" y="0" width="705" height="648" style="fill:rgb(100%,100%,100%);fill-opacity:1;stroke:none;"/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="17.023438" y="68.123047"/> + <use xlink:href="#glyph0-2" x="22.023438" y="68.123047"/> + <use xlink:href="#glyph0-3" x="27.023438" y="68.123047"/> + <use xlink:href="#glyph0-4" x="31.023438" y="68.123047"/> + <use xlink:href="#glyph0-5" x="33.023438" y="68.123047"/> + <use xlink:href="#glyph0-6" x="38.023438" y="68.123047"/> + <use xlink:href="#glyph0-7" x="40.023438" y="68.123047"/> + <use xlink:href="#glyph0-8" x="42.023438" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-9" x="17.023438" y="99.603516"/> + <use xlink:href="#glyph0-2" x="23.023438" y="99.603516"/> + <use xlink:href="#glyph0-10" x="28.023438" y="99.603516"/> + <use xlink:href="#glyph0-11" x="31.023438" y="99.603516"/> + <use xlink:href="#glyph0-7" x="35.023438" y="99.603516"/> + <use xlink:href="#glyph0-12" x="37.023438" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-9" x="17.023438" y="131.087891"/> + <use xlink:href="#glyph0-2" x="23.023438" y="131.087891"/> + <use xlink:href="#glyph0-10" x="28.023438" y="131.087891"/> + <use xlink:href="#glyph0-11" x="31.023438" y="131.087891"/> + <use xlink:href="#glyph0-7" x="35.023438" y="131.087891"/> + <use xlink:href="#glyph0-13" x="37.023438" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="17.023438" y="162.568359"/> + <use xlink:href="#glyph0-5" x="23.023438" y="162.568359"/> + <use xlink:href="#glyph0-4" x="28.023438" y="162.568359"/> + <use xlink:href="#glyph0-7" x="30.023438" y="162.568359"/> + <use xlink:href="#glyph0-12" x="32.023438" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="17.023438" y="194.048828"/> + <use xlink:href="#glyph0-5" x="23.023438" y="194.048828"/> + <use xlink:href="#glyph0-4" x="28.023438" y="194.048828"/> + <use xlink:href="#glyph0-7" x="30.023438" y="194.048828"/> + <use xlink:href="#glyph0-13" x="32.023438" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-15" x="17.023438" y="225.529297"/> + <use xlink:href="#glyph0-2" x="25.023438" y="225.529297"/> + <use xlink:href="#glyph0-10" x="30.023438" y="225.529297"/> + <use xlink:href="#glyph0-16" x="33.023438" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-17" x="17.023438" y="257.013672"/> + <use xlink:href="#glyph0-18" x="23.023438" y="257.013672"/> + <use xlink:href="#glyph0-6" x="28.023438" y="257.013672"/> + <use xlink:href="#glyph0-19" x="30.023438" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-20" x="17.023438" y="288.494141"/> + <use xlink:href="#glyph0-2" x="23.023438" y="288.494141"/> + <use xlink:href="#glyph0-10" x="28.023438" y="288.494141"/> + <use xlink:href="#glyph0-16" x="31.023438" y="288.494141"/> + <use xlink:href="#glyph0-18" x="38.023438" y="288.494141"/> + <use xlink:href="#glyph0-21" x="43.023438" y="288.494141"/> + <use xlink:href="#glyph0-22" x="48.023438" y="288.494141"/> + <use xlink:href="#glyph0-23" x="50.023438" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-9" x="17.023438" y="319.974609"/> + <use xlink:href="#glyph0-24" x="23.023438" y="319.974609"/> + <use xlink:href="#glyph0-21" x="27.023438" y="319.974609"/> + <use xlink:href="#glyph0-2" x="32.023438" y="319.974609"/> + <use xlink:href="#glyph0-16" x="37.023438" y="319.974609"/> + <use xlink:href="#glyph0-22" x="44.023438" y="319.974609"/> + <use xlink:href="#glyph0-23" x="46.023438" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="17.023438" y="351.455078"/> + <use xlink:href="#glyph0-10" x="24.023438" y="351.455078"/> + <use xlink:href="#glyph0-2" x="27.023438" y="351.455078"/> + <use xlink:href="#glyph0-24" x="31.023438" y="351.455078"/> + <use xlink:href="#glyph0-3" x="35.023438" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-26" x="17.023438" y="382.939453"/> + <use xlink:href="#glyph0-22" x="22.023438" y="382.939453"/> + <use xlink:href="#glyph0-27" x="24.023438" y="382.939453"/> + <use xlink:href="#glyph0-28" x="29.023438" y="382.939453"/> + <use xlink:href="#glyph0-4" x="34.023438" y="382.939453"/> + <use xlink:href="#glyph0-7" x="36.023438" y="382.939453"/> + <use xlink:href="#glyph0-25" x="38.023438" y="382.939453"/> + <use xlink:href="#glyph0-10" x="45.023438" y="382.939453"/> + <use xlink:href="#glyph0-2" x="48.023438" y="382.939453"/> + <use xlink:href="#glyph0-24" x="52.023438" y="382.939453"/> + <use xlink:href="#glyph0-3" x="56.023438" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="17.023438" y="414.419922"/> + <use xlink:href="#glyph0-6" x="23.023438" y="414.419922"/> + <use xlink:href="#glyph0-30" x="25.023438" y="414.419922"/> + <use xlink:href="#glyph0-5" x="30.023438" y="414.419922"/> + <use xlink:href="#glyph0-3" x="35.023438" y="414.419922"/> + <use xlink:href="#glyph0-7" x="39.023438" y="414.419922"/> + <use xlink:href="#glyph0-12" x="41.023438" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="17.023438" y="445.900391"/> + <use xlink:href="#glyph0-6" x="23.023438" y="445.900391"/> + <use xlink:href="#glyph0-30" x="25.023438" y="445.900391"/> + <use xlink:href="#glyph0-5" x="30.023438" y="445.900391"/> + <use xlink:href="#glyph0-3" x="35.023438" y="445.900391"/> + <use xlink:href="#glyph0-7" x="39.023438" y="445.900391"/> + <use xlink:href="#glyph0-13" x="41.023438" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="17.023438" y="477.380859"/> + <use xlink:href="#glyph0-30" x="23.023438" y="477.380859"/> + <use xlink:href="#glyph0-10" x="28.023438" y="477.380859"/> + <use xlink:href="#glyph0-31" x="31.023438" y="477.380859"/> + <use xlink:href="#glyph0-6" x="36.023438" y="477.380859"/> + <use xlink:href="#glyph0-5" x="38.023438" y="477.380859"/> + <use xlink:href="#glyph0-3" x="43.023438" y="477.380859"/> + <use xlink:href="#glyph0-7" x="47.023438" y="477.380859"/> + <use xlink:href="#glyph0-12" x="49.023438" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="17.023438" y="508.865234"/> + <use xlink:href="#glyph0-30" x="23.023438" y="508.865234"/> + <use xlink:href="#glyph0-10" x="28.023438" y="508.865234"/> + <use xlink:href="#glyph0-31" x="31.023438" y="508.865234"/> + <use xlink:href="#glyph0-6" x="36.023438" y="508.865234"/> + <use xlink:href="#glyph0-5" x="38.023438" y="508.865234"/> + <use xlink:href="#glyph0-3" x="43.023438" y="508.865234"/> + <use xlink:href="#glyph0-7" x="47.023438" y="508.865234"/> + <use xlink:href="#glyph0-13" x="49.023438" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="17.023438" y="540.345703"/> + <use xlink:href="#glyph0-5" x="23.023438" y="540.345703"/> + <use xlink:href="#glyph0-19" x="28.023438" y="540.345703"/> + <use xlink:href="#glyph0-3" x="33.023438" y="540.345703"/> + <use xlink:href="#glyph0-7" x="37.023438" y="540.345703"/> + <use xlink:href="#glyph0-12" x="39.023438" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="17.023438" y="571.826172"/> + <use xlink:href="#glyph0-5" x="23.023438" y="571.826172"/> + <use xlink:href="#glyph0-19" x="28.023438" y="571.826172"/> + <use xlink:href="#glyph0-3" x="33.023438" y="571.826172"/> + <use xlink:href="#glyph0-7" x="37.023438" y="571.826172"/> + <use xlink:href="#glyph0-13" x="39.023438" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(100%,77.254902%,81.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 72.148438 L 30.355469 72.148438 L 30.355469 87.890625 L 17.023438 87.890625 Z M 17.023438 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,83.137255%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 72.148438 L 43.6875 72.148438 L 43.6875 87.890625 L 30.355469 87.890625 Z M 30.355469 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(65.882353%,88.235294%,74.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 72.148438 L 57.023438 72.148438 L 57.023438 87.890625 L 43.691406 87.890625 Z M 43.691406 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(64.313725%,86.666667%,93.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 72.148438 L 70.355469 72.148438 L 70.355469 87.890625 L 57.023438 87.890625 Z M 57.023438 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(89.411765%,79.607843%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 72.148438 L 83.6875 72.148438 L 83.6875 87.890625 L 70.355469 87.890625 Z M 70.355469 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(78.431373%,47.843137%,54.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 103.628906 L 30.355469 103.628906 L 30.355469 119.371094 L 17.023438 119.371094 Z M 17.023438 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(63.529412%,56.470588%,28.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 103.628906 L 43.6875 103.628906 L 43.6875 119.371094 L 30.355469 119.371094 Z M 30.355469 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(27.058824%,63.529412%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 103.628906 L 57.023438 103.628906 L 57.023438 119.371094 L 43.691406 119.371094 Z M 43.691406 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(16.470588%,61.960784%,70.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 103.628906 L 70.355469 103.628906 L 70.355469 119.371094 L 57.023438 119.371094 Z M 57.023438 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,50.980392%,76.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 103.628906 L 83.6875 103.628906 L 83.6875 119.371094 L 70.355469 119.371094 Z M 70.355469 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(88.235294%,41.568627%,52.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 135.109375 L 30.355469 135.109375 L 30.355469 150.851562 L 17.023438 150.851562 Z M 17.023438 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(66.666667%,56.470588%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 135.109375 L 43.6875 135.109375 L 43.6875 150.851562 L 30.355469 150.851562 Z M 30.355469 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,66.666667%,35.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 135.109375 L 57.023438 135.109375 L 57.023438 150.851562 L 43.691406 150.851562 Z M 43.691406 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,65.098039%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 135.109375 L 70.355469 135.109375 L 70.355469 150.851562 L 57.023438 150.851562 Z M 57.023438 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(71.372549%,45.882353%,87.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 135.109375 L 83.6875 135.109375 L 83.6875 150.851562 L 70.355469 150.851562 Z M 70.355469 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,56.470588%,64.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 166.59375 L 30.355469 166.59375 L 30.355469 182.335938 L 17.023438 182.335938 Z M 17.023438 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(75.294118%,67.058824%,32.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 166.59375 L 43.6875 166.59375 L 43.6875 182.335938 L 30.355469 182.335938 Z M 30.355469 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(30.980392%,74.901961%,52.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 166.59375 L 57.023438 166.59375 L 57.023438 182.335938 L 43.691406 182.335938 Z M 43.691406 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(15.686275%,73.333333%,84.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 166.59375 L 70.355469 166.59375 L 70.355469 182.335938 L 57.023438 182.335938 Z M 57.023438 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(77.647059%,60%,90.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 166.59375 L 83.6875 166.59375 L 83.6875 182.335938 L 70.355469 182.335938 Z M 70.355469 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,70.196078%,70.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 198.074219 L 30.355469 198.074219 L 30.355469 213.816406 L 17.023438 213.816406 Z M 17.023438 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(81.176471%,78.823529%,50.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 198.074219 L 43.6875 198.074219 L 43.6875 213.816406 L 30.355469 213.816406 Z M 30.355469 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(46.27451%,85.098039%,69.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 198.074219 L 57.023438 198.074219 L 57.023438 213.816406 L 43.691406 213.816406 Z M 43.691406 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(52.156863%,81.568627%,94.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 198.074219 L 70.355469 198.074219 L 70.355469 213.816406 L 57.023438 213.816406 Z M 57.023438 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(90.588235%,70.980392%,96.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 198.074219 L 83.6875 198.074219 L 83.6875 213.816406 L 70.355469 213.816406 Z M 70.355469 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(67.058824%,69.019608%,39.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 229.554688 L 30.355469 229.554688 L 30.355469 245.296875 L 17.023438 245.296875 Z M 17.023438 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,65.490196%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 229.554688 L 43.6875 229.554688 L 43.6875 245.296875 L 30.355469 245.296875 Z M 30.355469 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,61.568627%,52.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 229.554688 L 57.023438 229.554688 L 57.023438 245.296875 L 43.691406 245.296875 Z M 43.691406 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(89.411765%,58.431373%,64.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 229.554688 L 70.355469 229.554688 L 70.355469 245.296875 L 57.023438 245.296875 Z M 57.023438 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(87.843137%,57.647059%,76.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 229.554688 L 83.6875 229.554688 L 83.6875 245.296875 L 70.355469 245.296875 Z M 70.355469 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(67.45098%,64.313725%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 261.035156 L 30.355469 261.035156 L 30.355469 276.777344 L 17.023438 276.777344 Z M 17.023438 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,69.019608%,86.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 261.035156 L 43.6875 261.035156 L 43.6875 276.777344 L 30.355469 276.777344 Z M 30.355469 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(29.803922%,72.54902%,80%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 261.035156 L 57.023438 261.035156 L 57.023438 276.777344 L 43.691406 276.777344 Z M 43.691406 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(22.352941%,74.509804%,69.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 261.035156 L 70.355469 261.035156 L 70.355469 276.777344 L 57.023438 276.777344 Z M 57.023438 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(36.078431%,74.117647%,57.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 261.035156 L 83.6875 261.035156 L 83.6875 276.777344 L 70.355469 276.777344 Z M 70.355469 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,65.490196%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 292.519531 L 30.355469 292.519531 L 30.355469 308.261719 L 17.023438 308.261719 Z M 17.023438 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(60%,70.980392%,41.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 292.519531 L 43.6875 292.519531 L 43.6875 308.261719 L 30.355469 308.261719 Z M 30.355469 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(36.078431%,74.117647%,57.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 292.519531 L 57.023438 292.519531 L 57.023438 308.261719 L 43.691406 308.261719 Z M 43.691406 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(23.137255%,73.72549%,74.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 292.519531 L 70.355469 292.519531 L 70.355469 308.261719 L 57.023438 308.261719 Z M 57.023438 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,69.019608%,86.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 292.519531 L 83.6875 292.519531 L 83.6875 308.261719 L 70.355469 308.261719 Z M 70.355469 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,61.568627%,52.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 324 L 30.355469 324 L 30.355469 339.742188 L 17.023438 339.742188 Z M 17.023438 324 "/> +<path style="fill-rule:nonzero;fill:rgb(61.568627%,70.588235%,41.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 324 L 43.6875 324 L 43.6875 339.742188 L 30.355469 339.742188 Z M 30.355469 324 "/> +<path style="fill-rule:nonzero;fill:rgb(23.921569%,74.509804%,67.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 324 L 57.023438 324 L 57.023438 339.742188 L 43.691406 339.742188 Z M 43.691406 324 "/> +<path style="fill-rule:nonzero;fill:rgb(52.941176%,68.235294%,87.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 324 L 70.355469 324 L 70.355469 339.742188 L 57.023438 339.742188 Z M 57.023438 324 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,58.431373%,80%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 324 L 83.6875 324 L 83.6875 339.742188 L 70.355469 339.742188 Z M 70.355469 324 "/> +<path style="fill-rule:nonzero;fill:rgb(10.588235%,10.588235%,10.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 355.480469 L 30.355469 355.480469 L 30.355469 371.222656 L 17.023438 371.222656 Z M 17.023438 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(34.509804%,34.509804%,34.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 355.480469 L 43.6875 355.480469 L 43.6875 371.222656 L 30.355469 371.222656 Z M 30.355469 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(58.823529%,58.823529%,58.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 355.480469 L 57.023438 355.480469 L 57.023438 371.222656 L 43.691406 371.222656 Z M 43.691406 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(81.568627%,81.568627%,81.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 355.480469 L 70.355469 355.480469 L 70.355469 371.222656 L 57.023438 371.222656 Z M 57.023438 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 355.480469 L 83.6875 355.480469 L 83.6875 371.222656 L 70.355469 371.222656 Z M 70.355469 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(27.843137%,27.843137%,27.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 386.964844 L 30.355469 386.964844 L 30.355469 402.707031 L 17.023438 402.707031 Z M 17.023438 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(47.843137%,47.843137%,47.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 386.964844 L 43.6875 386.964844 L 43.6875 402.707031 L 30.355469 402.707031 Z M 30.355469 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(65.882353%,65.882353%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 386.964844 L 57.023438 386.964844 L 57.023438 402.707031 L 43.691406 402.707031 Z M 43.691406 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(80.392157%,80.392157%,80.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 386.964844 L 70.355469 386.964844 L 70.355469 402.707031 L 57.023438 402.707031 Z M 57.023438 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 386.964844 L 83.6875 386.964844 L 83.6875 402.707031 L 70.355469 402.707031 Z M 70.355469 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,24.705882%,64.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 418.445312 L 30.355469 418.445312 L 30.355469 434.1875 L 17.023438 434.1875 Z M 17.023438 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(41.568627%,46.27451%,69.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 418.445312 L 43.6875 418.445312 L 43.6875 434.1875 L 30.355469 434.1875 Z M 30.355469 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(63.137255%,65.098039%,78.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 418.445312 L 57.023438 418.445312 L 57.023438 434.1875 L 43.691406 434.1875 Z M 43.691406 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,80.392157%,85.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 418.445312 L 70.355469 418.445312 L 70.355469 434.1875 L 57.023438 434.1875 Z M 57.023438 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 418.445312 L 83.6875 418.445312 L 83.6875 434.1875 L 70.355469 434.1875 Z M 70.355469 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,21.176471%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 449.925781 L 30.355469 449.925781 L 30.355469 465.667969 L 17.023438 465.667969 Z M 17.023438 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,44.705882%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 449.925781 L 43.6875 449.925781 L 43.6875 465.667969 L 30.355469 465.667969 Z M 30.355469 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(47.45098%,67.058824%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 449.925781 L 57.023438 449.925781 L 57.023438 465.667969 L 43.691406 465.667969 Z M 43.691406 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(76.470588%,85.882353%,99.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 449.925781 L 70.355469 449.925781 L 70.355469 465.667969 L 57.023438 465.667969 Z M 57.023438 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 449.925781 L 83.6875 449.925781 L 83.6875 465.667969 L 70.355469 465.667969 Z M 70.355469 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(23.529412%,14.901961%,57.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 481.40625 L 30.355469 481.40625 L 30.355469 497.148438 L 17.023438 497.148438 Z M 17.023438 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(42.352941%,39.215686%,63.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 481.40625 L 43.6875 481.40625 L 43.6875 497.148438 L 30.355469 497.148438 Z M 30.355469 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(61.568627%,59.607843%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 481.40625 L 57.023438 481.40625 L 57.023438 497.148438 L 43.691406 497.148438 Z M 43.691406 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,78.823529%,85.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 481.40625 L 70.355469 481.40625 L 70.355469 497.148438 L 57.023438 497.148438 Z M 57.023438 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 481.40625 L 83.6875 481.40625 L 83.6875 497.148438 L 70.355469 497.148438 Z M 70.355469 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(19.215686%,13.333333%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 512.890625 L 30.355469 512.890625 L 30.355469 528.632812 L 17.023438 528.632812 Z M 17.023438 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(42.745098%,37.647059%,73.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 512.890625 L 43.6875 512.890625 L 43.6875 528.632812 L 30.355469 528.632812 Z M 30.355469 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,62.352941%,88.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 512.890625 L 57.023438 512.890625 L 57.023438 528.632812 L 43.691406 528.632812 Z M 43.691406 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,83.921569%,98.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 512.890625 L 70.355469 512.890625 L 70.355469 528.632812 L 57.023438 528.632812 Z M 57.023438 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 512.890625 L 83.6875 512.890625 L 83.6875 528.632812 L 70.355469 528.632812 Z M 70.355469 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(49.803922%,0%,5.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 544.371094 L 30.355469 544.371094 L 30.355469 560.113281 L 17.023438 560.113281 Z M 17.023438 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(66.27451%,33.72549%,35.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 544.371094 L 43.6875 544.371094 L 43.6875 560.113281 L 30.355469 560.113281 Z M 30.355469 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(79.215686%,58.039216%,58.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 544.371094 L 57.023438 544.371094 L 57.023438 560.113281 L 43.691406 560.113281 Z M 43.691406 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,79.607843%,79.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 544.371094 L 70.355469 544.371094 L 70.355469 560.113281 L 57.023438 560.113281 Z M 57.023438 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 544.371094 L 83.6875 544.371094 L 83.6875 560.113281 L 70.355469 560.113281 Z M 70.355469 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(41.176471%,0%,4.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 17.023438 575.851562 L 30.355469 575.851562 L 30.355469 591.59375 L 17.023438 591.59375 Z M 17.023438 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(80%,10.980392%,18.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 30.355469 575.851562 L 43.6875 575.851562 L 43.6875 591.59375 L 30.355469 591.59375 Z M 30.355469 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,43.921569%,47.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 43.691406 575.851562 L 57.023438 575.851562 L 57.023438 591.59375 L 43.691406 591.59375 Z M 43.691406 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,74.509804%,75.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 57.023438 575.851562 L 70.355469 575.851562 L 70.355469 591.59375 L 57.023438 591.59375 Z M 57.023438 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 70.355469 575.851562 L 83.6875 575.851562 L 83.6875 591.59375 L 70.355469 591.59375 Z M 70.355469 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="117.738281" y="68.123047"/> + <use xlink:href="#glyph0-10" x="124.738281" y="68.123047"/> + <use xlink:href="#glyph0-5" x="127.738281" y="68.123047"/> + <use xlink:href="#glyph0-5" x="132.738281" y="68.123047"/> + <use xlink:href="#glyph0-21" x="137.738281" y="68.123047"/> + <use xlink:href="#glyph0-3" x="142.738281" y="68.123047"/> + <use xlink:href="#glyph0-7" x="146.738281" y="68.123047"/> + <use xlink:href="#glyph0-12" x="148.738281" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="117.738281" y="99.603516"/> + <use xlink:href="#glyph0-10" x="124.738281" y="99.603516"/> + <use xlink:href="#glyph0-5" x="127.738281" y="99.603516"/> + <use xlink:href="#glyph0-5" x="132.738281" y="99.603516"/> + <use xlink:href="#glyph0-21" x="137.738281" y="99.603516"/> + <use xlink:href="#glyph0-3" x="142.738281" y="99.603516"/> + <use xlink:href="#glyph0-7" x="146.738281" y="99.603516"/> + <use xlink:href="#glyph0-13" x="148.738281" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-33" x="117.738281" y="131.087891"/> + <use xlink:href="#glyph0-3" x="124.738281" y="131.087891"/> + <use xlink:href="#glyph0-6" x="128.738281" y="131.087891"/> + <use xlink:href="#glyph0-18" x="130.738281" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="117.738281" y="162.568359"/> + <use xlink:href="#glyph0-30" x="123.738281" y="162.568359"/> + <use xlink:href="#glyph0-10" x="128.738281" y="162.568359"/> + <use xlink:href="#glyph0-31" x="131.738281" y="162.568359"/> + <use xlink:href="#glyph0-6" x="136.738281" y="162.568359"/> + <use xlink:href="#glyph0-5" x="138.738281" y="162.568359"/> + <use xlink:href="#glyph0-34" x="143.738281" y="162.568359"/> + <use xlink:href="#glyph0-29" x="146.738281" y="162.568359"/> + <use xlink:href="#glyph0-6" x="152.738281" y="162.568359"/> + <use xlink:href="#glyph0-30" x="154.738281" y="162.568359"/> + <use xlink:href="#glyph0-5" x="159.738281" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="117.738281" y="194.048828"/> + <use xlink:href="#glyph0-5" x="123.738281" y="194.048828"/> + <use xlink:href="#glyph0-19" x="128.738281" y="194.048828"/> + <use xlink:href="#glyph0-34" x="133.738281" y="194.048828"/> + <use xlink:href="#glyph0-1" x="136.738281" y="194.048828"/> + <use xlink:href="#glyph0-30" x="142.738281" y="194.048828"/> + <use xlink:href="#glyph0-10" x="147.738281" y="194.048828"/> + <use xlink:href="#glyph0-31" x="150.738281" y="194.048828"/> + <use xlink:href="#glyph0-6" x="155.738281" y="194.048828"/> + <use xlink:href="#glyph0-5" x="157.738281" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="117.738281" y="225.529297"/> + <use xlink:href="#glyph0-5" x="123.738281" y="225.529297"/> + <use xlink:href="#glyph0-19" x="128.738281" y="225.529297"/> + <use xlink:href="#glyph0-34" x="133.738281" y="225.529297"/> + <use xlink:href="#glyph0-29" x="136.738281" y="225.529297"/> + <use xlink:href="#glyph0-6" x="142.738281" y="225.529297"/> + <use xlink:href="#glyph0-30" x="144.738281" y="225.529297"/> + <use xlink:href="#glyph0-5" x="149.738281" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="117.738281" y="257.013672"/> + <use xlink:href="#glyph0-30" x="123.738281" y="257.013672"/> + <use xlink:href="#glyph0-10" x="128.738281" y="257.013672"/> + <use xlink:href="#glyph0-31" x="131.738281" y="257.013672"/> + <use xlink:href="#glyph0-6" x="136.738281" y="257.013672"/> + <use xlink:href="#glyph0-5" x="138.738281" y="257.013672"/> + <use xlink:href="#glyph0-34" x="143.738281" y="257.013672"/> + <use xlink:href="#glyph0-33" x="146.738281" y="257.013672"/> + <use xlink:href="#glyph0-10" x="153.738281" y="257.013672"/> + <use xlink:href="#glyph0-2" x="156.738281" y="257.013672"/> + <use xlink:href="#glyph0-21" x="161.738281" y="257.013672"/> + <use xlink:href="#glyph0-27" x="166.738281" y="257.013672"/> + <use xlink:href="#glyph0-5" x="171.738281" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="117.738281" y="288.494141"/> + <use xlink:href="#glyph0-30" x="123.738281" y="288.494141"/> + <use xlink:href="#glyph0-10" x="128.738281" y="288.494141"/> + <use xlink:href="#glyph0-31" x="131.738281" y="288.494141"/> + <use xlink:href="#glyph0-6" x="136.738281" y="288.494141"/> + <use xlink:href="#glyph0-5" x="138.738281" y="288.494141"/> + <use xlink:href="#glyph0-34" x="143.738281" y="288.494141"/> + <use xlink:href="#glyph0-35" x="145.738281" y="288.494141"/> + <use xlink:href="#glyph0-5" x="150.738281" y="288.494141"/> + <use xlink:href="#glyph0-6" x="155.738281" y="288.494141"/> + <use xlink:href="#glyph0-6" x="157.738281" y="288.494141"/> + <use xlink:href="#glyph0-18" x="159.738281" y="288.494141"/> + <use xlink:href="#glyph0-36" x="164.738281" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="117.738281" y="319.974609"/> + <use xlink:href="#glyph0-6" x="123.738281" y="319.974609"/> + <use xlink:href="#glyph0-30" x="125.738281" y="319.974609"/> + <use xlink:href="#glyph0-5" x="130.738281" y="319.974609"/> + <use xlink:href="#glyph0-34" x="135.738281" y="319.974609"/> + <use xlink:href="#glyph0-35" x="137.738281" y="319.974609"/> + <use xlink:href="#glyph0-5" x="142.738281" y="319.974609"/> + <use xlink:href="#glyph0-6" x="147.738281" y="319.974609"/> + <use xlink:href="#glyph0-6" x="149.738281" y="319.974609"/> + <use xlink:href="#glyph0-18" x="151.738281" y="319.974609"/> + <use xlink:href="#glyph0-36" x="156.738281" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="117.738281" y="351.455078"/> + <use xlink:href="#glyph0-10" x="124.738281" y="351.455078"/> + <use xlink:href="#glyph0-5" x="127.738281" y="351.455078"/> + <use xlink:href="#glyph0-5" x="132.738281" y="351.455078"/> + <use xlink:href="#glyph0-21" x="137.738281" y="351.455078"/> + <use xlink:href="#glyph0-34" x="142.738281" y="351.455078"/> + <use xlink:href="#glyph0-35" x="144.738281" y="351.455078"/> + <use xlink:href="#glyph0-5" x="149.738281" y="351.455078"/> + <use xlink:href="#glyph0-6" x="154.738281" y="351.455078"/> + <use xlink:href="#glyph0-6" x="156.738281" y="351.455078"/> + <use xlink:href="#glyph0-18" x="158.738281" y="351.455078"/> + <use xlink:href="#glyph0-36" x="163.738281" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="117.738281" y="382.939453"/> + <use xlink:href="#glyph0-5" x="123.738281" y="382.939453"/> + <use xlink:href="#glyph0-19" x="128.738281" y="382.939453"/> + <use xlink:href="#glyph0-34" x="133.738281" y="382.939453"/> + <use xlink:href="#glyph0-35" x="135.738281" y="382.939453"/> + <use xlink:href="#glyph0-5" x="140.738281" y="382.939453"/> + <use xlink:href="#glyph0-6" x="145.738281" y="382.939453"/> + <use xlink:href="#glyph0-6" x="147.738281" y="382.939453"/> + <use xlink:href="#glyph0-18" x="149.738281" y="382.939453"/> + <use xlink:href="#glyph0-36" x="154.738281" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-20" x="117.738281" y="414.419922"/> + <use xlink:href="#glyph0-5" x="123.738281" y="414.419922"/> + <use xlink:href="#glyph0-2" x="128.738281" y="414.419922"/> + <use xlink:href="#glyph0-4" x="133.738281" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-20" x="117.738281" y="445.900391"/> + <use xlink:href="#glyph0-5" x="123.738281" y="445.900391"/> + <use xlink:href="#glyph0-2" x="128.738281" y="445.900391"/> + <use xlink:href="#glyph0-4" x="133.738281" y="445.900391"/> + <use xlink:href="#glyph0-7" x="135.738281" y="445.900391"/> + <use xlink:href="#glyph0-12" x="137.738281" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="117.738281" y="477.380859"/> + <use xlink:href="#glyph0-5" x="121.738281" y="477.380859"/> + <use xlink:href="#glyph0-10" x="126.738281" y="477.380859"/> + <use xlink:href="#glyph0-10" x="129.738281" y="477.380859"/> + <use xlink:href="#glyph0-2" x="132.738281" y="477.380859"/> + <use xlink:href="#glyph0-22" x="137.738281" y="477.380859"/> + <use xlink:href="#glyph0-21" x="139.738281" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="117.738281" y="508.865234"/> + <use xlink:href="#glyph0-5" x="121.738281" y="508.865234"/> + <use xlink:href="#glyph0-10" x="126.738281" y="508.865234"/> + <use xlink:href="#glyph0-10" x="129.738281" y="508.865234"/> + <use xlink:href="#glyph0-2" x="132.738281" y="508.865234"/> + <use xlink:href="#glyph0-22" x="137.738281" y="508.865234"/> + <use xlink:href="#glyph0-21" x="139.738281" y="508.865234"/> + <use xlink:href="#glyph0-7" x="144.738281" y="508.865234"/> + <use xlink:href="#glyph0-12" x="146.738281" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-38" x="117.738281" y="540.345703"/> + <use xlink:href="#glyph0-22" x="123.738281" y="540.345703"/> + <use xlink:href="#glyph0-10" x="125.738281" y="540.345703"/> + <use xlink:href="#glyph0-22" x="128.738281" y="540.345703"/> + <use xlink:href="#glyph0-19" x="130.738281" y="540.345703"/> + <use xlink:href="#glyph0-22" x="135.738281" y="540.345703"/> + <use xlink:href="#glyph0-3" x="137.738281" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="117.738281" y="571.826172"/> + <use xlink:href="#glyph0-6" x="122.738281" y="571.826172"/> + <use xlink:href="#glyph0-2" x="124.738281" y="571.826172"/> + <use xlink:href="#glyph0-3" x="129.738281" y="571.826172"/> + <use xlink:href="#glyph0-16" x="133.738281" y="571.826172"/> + <use xlink:href="#glyph0-2" x="140.738281" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(0%,37.647059%,15.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 72.148438 L 131.070312 72.148438 L 131.070312 87.890625 L 117.738281 87.890625 Z M 117.738281 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(36.862745%,54.509804%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 72.148438 L 144.402344 72.148438 L 144.402344 87.890625 L 131.070312 87.890625 Z M 131.070312 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(60.392157%,70.196078%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 72.148438 L 157.738281 72.148438 L 157.738281 87.890625 L 144.40625 87.890625 Z M 144.40625 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(80.392157%,84.313725%,81.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 72.148438 L 171.070312 72.148438 L 171.070312 87.890625 L 157.738281 87.890625 Z M 157.738281 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 72.148438 L 184.402344 72.148438 L 184.402344 87.890625 L 171.070312 87.890625 Z M 171.070312 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,27.45098%,8.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 103.628906 L 131.070312 103.628906 L 131.070312 119.371094 L 117.738281 119.371094 Z M 117.738281 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(9.411765%,54.509804%,25.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 103.628906 L 144.402344 103.628906 L 144.402344 119.371094 L 131.070312 119.371094 Z M 131.070312 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(45.490196%,76.078431%,52.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 103.628906 L 157.738281 103.628906 L 157.738281 119.371094 L 144.40625 119.371094 Z M 144.40625 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(76.862745%,90.980392%,79.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 103.628906 L 171.070312 103.628906 L 171.070312 119.371094 L 157.738281 119.371094 Z M 157.738281 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 103.628906 L 184.402344 103.628906 L 184.402344 119.371094 L 171.070312 119.371094 Z M 171.070312 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,98.823529%,98.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 135.109375 L 131.070312 135.109375 L 131.070312 150.851562 L 117.738281 150.851562 Z M 117.738281 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(64.313725%,72.156863%,86.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 135.109375 L 144.402344 135.109375 L 144.402344 150.851562 L 131.070312 150.851562 Z M 131.070312 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(23.529412%,47.45098%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 135.109375 L 157.738281 135.109375 L 157.738281 150.851562 L 144.40625 150.851562 Z M 144.40625 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(11.372549%,24.313725%,39.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 135.109375 L 171.070312 135.109375 L 171.070312 150.851562 L 157.738281 150.851562 Z M 157.738281 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(1.568627%,1.568627%,1.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 135.109375 L 184.402344 135.109375 L 184.402344 150.851562 L 171.070312 150.851562 Z M 171.070312 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(41.960784%,0%,46.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 166.59375 L 131.070312 166.59375 L 131.070312 182.335938 L 117.738281 182.335938 Z M 117.738281 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(46.27451%,39.607843%,64.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 166.59375 L 144.402344 166.59375 L 144.402344 182.335938 L 131.070312 182.335938 Z M 131.070312 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(55.294118%,63.921569%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 166.59375 L 157.738281 166.59375 L 157.738281 182.335938 L 144.40625 182.335938 Z M 144.40625 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(71.764706%,83.529412%,89.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 166.59375 L 171.070312 166.59375 L 171.070312 182.335938 L 157.738281 182.335938 Z M 157.738281 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 166.59375 L 184.402344 166.59375 L 184.402344 182.335938 L 171.070312 182.335938 Z M 171.070312 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,0.392157%,7.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 198.074219 L 131.070312 198.074219 L 131.070312 213.816406 L 117.738281 213.816406 Z M 117.738281 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(70.196078%,29.019608%,47.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 198.074219 L 144.402344 198.074219 L 144.402344 213.816406 L 131.070312 213.816406 Z M 131.070312 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,54.117647%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 198.074219 L 157.738281 198.074219 L 157.738281 213.816406 L 144.40625 213.816406 Z M 144.40625 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,76.862745%,93.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 198.074219 L 171.070312 198.074219 L 171.070312 213.816406 L 157.738281 213.816406 Z M 157.738281 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,94.117647%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 198.074219 L 184.402344 198.074219 L 184.402344 213.816406 L 171.070312 213.816406 Z M 171.070312 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(66.27451%,19.215686%,32.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 229.554688 L 131.070312 229.554688 L 131.070312 245.296875 L 117.738281 245.296875 Z M 117.738281 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(72.941176%,29.411765%,55.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 229.554688 L 144.402344 229.554688 L 144.402344 245.296875 L 131.070312 245.296875 Z M 131.070312 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(73.72549%,43.137255%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 229.554688 L 157.738281 229.554688 L 157.738281 245.296875 L 144.40625 245.296875 Z M 144.40625 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(70.588235%,58.039216%,83.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 229.554688 L 171.070312 229.554688 L 171.070312 245.296875 L 157.738281 245.296875 Z M 157.738281 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(68.235294%,71.372549%,89.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 229.554688 L 184.402344 229.554688 L 184.402344 245.296875 L 171.070312 245.296875 Z M 171.070312 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(35.686275%,21.568627%,58.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 261.035156 L 131.070312 261.035156 L 131.070312 276.777344 L 117.738281 276.777344 Z M 117.738281 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(60%,32.54902%,63.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 261.035156 L 144.402344 261.035156 L 144.402344 276.777344 L 131.070312 276.777344 Z M 131.070312 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(78.431373%,47.843137%,67.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 261.035156 L 157.738281 261.035156 L 157.738281 276.777344 L 144.40625 276.777344 Z M 144.40625 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(92.156863%,65.882353%,72.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 261.035156 L 171.070312 261.035156 L 171.070312 276.777344 L 157.738281 276.777344 Z M 157.738281 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,86.27451%,85.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 261.035156 L 184.402344 261.035156 L 184.402344 276.777344 L 171.070312 276.777344 Z M 171.070312 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(50.196078%,7.843137%,43.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 292.519531 L 131.070312 292.519531 L 131.070312 308.261719 L 117.738281 308.261719 Z M 117.738281 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(39.215686%,45.490196%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 292.519531 L 144.402344 292.519531 L 144.402344 308.261719 L 131.070312 308.261719 Z M 131.070312 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(20.392157%,72.156863%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 292.519531 L 157.738281 292.519531 L 157.738281 308.261719 L 144.40625 308.261719 Z M 144.40625 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(64.313725%,87.843137%,71.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 292.519531 L 171.070312 292.519531 L 171.070312 308.261719 L 157.738281 308.261719 Z M 157.738281 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,94.901961%,84.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 292.519531 L 184.402344 292.519531 L 184.402344 308.261719 L 171.070312 308.261719 Z M 171.070312 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(17.647059%,19.215686%,51.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 324 L 131.070312 324 L 131.070312 339.742188 L 117.738281 339.742188 Z M 117.738281 324 "/> +<path style="fill-rule:nonzero;fill:rgb(3.921569%,57.254902%,67.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 324 L 144.402344 324 L 144.402344 339.742188 L 131.070312 339.742188 Z M 131.070312 324 "/> +<path style="fill-rule:nonzero;fill:rgb(46.666667%,81.176471%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 324 L 157.738281 324 L 157.738281 339.742188 L 144.40625 339.742188 Z M 144.40625 324 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,92.941176%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 324 L 171.070312 324 L 171.070312 339.742188 L 157.738281 339.742188 Z M 157.738281 324 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,94.509804%,89.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 324 L 184.402344 324 L 184.402344 339.742188 L 171.070312 339.742188 Z M 171.070312 324 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,43.137255%,21.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 355.480469 L 131.070312 355.480469 L 131.070312 371.222656 L 117.738281 371.222656 Z M 117.738281 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(45.490196%,64.705882%,43.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 355.480469 L 144.402344 355.480469 L 144.402344 371.222656 L 131.070312 371.222656 Z M 131.070312 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(71.764706%,81.568627%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 355.480469 L 157.738281 355.480469 L 157.738281 371.222656 L 144.40625 371.222656 Z M 144.40625 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(90.196078%,92.941176%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 355.480469 L 171.070312 355.480469 L 171.070312 371.222656 L 157.738281 371.222656 Z M 157.738281 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,96.862745%,91.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 355.480469 L 184.402344 355.480469 L 184.402344 371.222656 L 171.070312 371.222656 Z M 171.070312 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,0.392157%,7.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 386.964844 L 131.070312 386.964844 L 131.070312 402.707031 L 117.738281 402.707031 Z M 117.738281 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(66.666667%,34.901961%,17.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 386.964844 L 144.402344 386.964844 L 144.402344 402.707031 L 131.070312 402.707031 Z M 131.070312 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(80.784314%,59.215686%,34.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 386.964844 L 157.738281 386.964844 L 157.738281 402.707031 L 144.40625 402.707031 Z M 144.40625 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(90.980392%,80.784314%,56.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 386.964844 L 171.070312 386.964844 L 171.070312 402.707031 L 157.738281 402.707031 Z M 157.738281 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,94.509804%,89.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 386.964844 L 184.402344 386.964844 L 184.402344 402.707031 L 171.070312 402.707031 Z M 171.070312 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(55.686275%,2.352941%,23.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 418.445312 L 131.070312 418.445312 L 131.070312 434.1875 L 117.738281 434.1875 Z M 117.738281 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,42.745098%,32.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 418.445312 L 144.402344 418.445312 L 144.402344 434.1875 L 131.070312 434.1875 Z M 131.070312 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(93.333333%,67.058824%,39.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 418.445312 L 157.738281 418.445312 L 157.738281 434.1875 L 144.40625 434.1875 Z M 144.40625 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,83.529412%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 418.445312 L 171.070312 418.445312 L 171.070312 434.1875 L 157.738281 434.1875 Z M 157.738281 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,90.196078%,74.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 418.445312 L 184.402344 418.445312 L 184.402344 434.1875 L 171.070312 434.1875 Z M 171.070312 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,24.705882%,41.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 449.925781 L 131.070312 449.925781 L 131.070312 465.667969 L 117.738281 465.667969 Z M 117.738281 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(88.235294%,43.921569%,29.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 449.925781 L 144.402344 449.925781 L 144.402344 465.667969 L 131.070312 465.667969 Z M 131.070312 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,60.392157%,17.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 449.925781 L 157.738281 449.925781 L 157.738281 465.667969 L 144.40625 465.667969 Z M 144.40625 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(90.980392%,76.470588%,23.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 449.925781 L 171.070312 449.925781 L 171.070312 465.667969 L 157.738281 465.667969 Z M 157.738281 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,90.196078%,74.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 449.925781 L 184.402344 449.925781 L 184.402344 465.667969 L 171.070312 465.667969 Z M 171.070312 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(14.901961%,65.098039%,22.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 481.40625 L 131.070312 481.40625 L 131.070312 497.148438 L 117.738281 497.148438 Z M 117.738281 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(60.784314%,70.196078%,2.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 481.40625 L 144.402344 481.40625 L 144.402344 497.148438 L 131.070312 497.148438 Z M 131.070312 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(88.235294%,73.333333%,30.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 481.40625 L 157.738281 481.40625 L 157.738281 497.148438 L 144.40625 497.148438 Z M 144.40625 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,77.254902%,61.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 481.40625 L 171.070312 481.40625 L 171.070312 497.148438 L 157.738281 497.148438 Z M 157.738281 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 481.40625 L 184.402344 481.40625 L 184.402344 497.148438 L 171.070312 497.148438 Z M 171.070312 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,48.627451%,11.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 512.890625 L 131.070312 512.890625 L 131.070312 528.632812 L 117.738281 528.632812 Z M 117.738281 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(49.803922%,61.568627%,26.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 512.890625 L 144.402344 512.890625 L 144.402344 528.632812 L 131.070312 528.632812 Z M 131.070312 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(75.294118%,72.156863%,47.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 512.890625 L 157.738281 512.890625 L 157.738281 528.632812 L 144.40625 528.632812 Z M 144.40625 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,80.784314%,68.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 512.890625 L 171.070312 512.890625 L 171.070312 528.632812 L 157.738281 528.632812 Z M 157.738281 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 512.890625 L 184.402344 512.890625 L 184.402344 528.632812 L 171.070312 528.632812 Z M 171.070312 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(29.411765%,0%,33.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 544.371094 L 131.070312 544.371094 L 131.070312 560.113281 L 117.738281 560.113281 Z M 117.738281 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,34.509804%,54.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 544.371094 L 144.402344 544.371094 L 144.402344 560.113281 L 131.070312 560.113281 Z M 131.070312 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,60.784314%,58.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 544.371094 L 157.738281 544.371094 L 157.738281 560.113281 L 144.40625 560.113281 Z M 144.40625 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(32.54902%,80%,40.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 544.371094 L 171.070312 544.371094 L 171.070312 560.113281 L 157.738281 560.113281 Z M 157.738281 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(99.215686%,89.019608%,20%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 544.371094 L 184.402344 544.371094 L 184.402344 560.113281 L 171.070312 560.113281 Z M 171.070312 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,9.411765%,53.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 117.738281 575.851562 L 131.070312 575.851562 L 131.070312 591.59375 L 117.738281 591.59375 Z M 117.738281 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(56.862745%,0%,55.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 131.070312 575.851562 L 144.402344 575.851562 L 144.402344 591.59375 L 131.070312 591.59375 Z M 131.070312 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(82.352941%,30.588235%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 144.40625 575.851562 L 157.738281 575.851562 L 157.738281 591.59375 L 144.40625 591.59375 Z M 144.40625 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,63.529412%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 157.738281 575.851562 L 171.070312 575.851562 L 171.070312 591.59375 L 157.738281 591.59375 Z M 157.738281 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,100%,27.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 171.070312 575.851562 L 184.402344 575.851562 L 184.402344 591.59375 L 171.070312 591.59375 Z M 171.070312 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-39" x="218.453125" y="68.123047"/> + <use xlink:href="#glyph0-21" x="220.453125" y="68.123047"/> + <use xlink:href="#glyph0-40" x="225.453125" y="68.123047"/> + <use xlink:href="#glyph0-5" x="227.453125" y="68.123047"/> + <use xlink:href="#glyph0-10" x="232.453125" y="68.123047"/> + <use xlink:href="#glyph0-21" x="235.453125" y="68.123047"/> + <use xlink:href="#glyph0-18" x="240.453125" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="218.453125" y="99.603516"/> + <use xlink:href="#glyph0-18" x="224.453125" y="99.603516"/> + <use xlink:href="#glyph0-23" x="229.453125" y="99.603516"/> + <use xlink:href="#glyph0-11" x="233.453125" y="99.603516"/> + <use xlink:href="#glyph0-5" x="237.453125" y="99.603516"/> + <use xlink:href="#glyph0-4" x="242.453125" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-41" x="218.453125" y="131.087891"/> + <use xlink:href="#glyph0-2" x="225.453125" y="131.087891"/> + <use xlink:href="#glyph0-11" x="230.453125" y="131.087891"/> + <use xlink:href="#glyph0-18" x="234.453125" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-9" x="218.453125" y="162.568359"/> + <use xlink:href="#glyph0-2" x="224.453125" y="162.568359"/> + <use xlink:href="#glyph0-10" x="229.453125" y="162.568359"/> + <use xlink:href="#glyph0-11" x="232.453125" y="162.568359"/> + <use xlink:href="#glyph0-7" x="236.453125" y="162.568359"/> + <use xlink:href="#glyph0-41" x="238.453125" y="162.568359"/> + <use xlink:href="#glyph0-22" x="245.453125" y="162.568359"/> + <use xlink:href="#glyph0-21" x="247.453125" y="162.568359"/> + <use xlink:href="#glyph0-4" x="252.453125" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-41" x="218.453125" y="194.048828"/> + <use xlink:href="#glyph0-22" x="225.453125" y="194.048828"/> + <use xlink:href="#glyph0-21" x="227.453125" y="194.048828"/> + <use xlink:href="#glyph0-4" x="232.453125" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="218.453125" y="225.529297"/> + <use xlink:href="#glyph0-6" x="224.453125" y="225.529297"/> + <use xlink:href="#glyph0-30" x="226.453125" y="225.529297"/> + <use xlink:href="#glyph0-25" x="231.453125" y="225.529297"/> + <use xlink:href="#glyph0-10" x="238.453125" y="225.529297"/> + <use xlink:href="#glyph0-21" x="241.453125" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="218.453125" y="257.013672"/> + <use xlink:href="#glyph0-5" x="222.453125" y="257.013672"/> + <use xlink:href="#glyph0-2" x="227.453125" y="257.013672"/> + <use xlink:href="#glyph0-6" x="232.453125" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="218.453125" y="288.494141"/> + <use xlink:href="#glyph0-5" x="222.453125" y="288.494141"/> + <use xlink:href="#glyph0-2" x="227.453125" y="288.494141"/> + <use xlink:href="#glyph0-6" x="232.453125" y="288.494141"/> + <use xlink:href="#glyph0-25" x="234.453125" y="288.494141"/> + <use xlink:href="#glyph0-10" x="241.453125" y="288.494141"/> + <use xlink:href="#glyph0-21" x="244.453125" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-42" x="218.453125" y="319.974609"/> + <use xlink:href="#glyph0-16" x="224.453125" y="319.974609"/> + <use xlink:href="#glyph0-10" x="231.453125" y="319.974609"/> + <use xlink:href="#glyph0-6" x="234.453125" y="319.974609"/> + <use xlink:href="#glyph0-19" x="236.453125" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="218.453125" y="351.455078"/> + <use xlink:href="#glyph0-6" x="224.453125" y="351.455078"/> + <use xlink:href="#glyph0-30" x="226.453125" y="351.455078"/> + <use xlink:href="#glyph0-35" x="231.453125" y="351.455078"/> + <use xlink:href="#glyph0-6" x="237.453125" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-2" x="218.453125" y="382.939453"/> + <use xlink:href="#glyph0-27" x="223.453125" y="382.939453"/> + <use xlink:href="#glyph0-43" x="228.453125" y="382.939453"/> + <use xlink:href="#glyph0-25" x="233.453125" y="382.939453"/> + <use xlink:href="#glyph0-10" x="240.453125" y="382.939453"/> + <use xlink:href="#glyph0-21" x="243.453125" y="382.939453"/> + <use xlink:href="#glyph0-35" x="248.453125" y="382.939453"/> + <use xlink:href="#glyph0-6" x="254.453125" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="218.453125" y="414.419922"/> + <use xlink:href="#glyph0-5" x="223.453125" y="414.419922"/> + <use xlink:href="#glyph0-2" x="228.453125" y="414.419922"/> + <use xlink:href="#glyph0-23" x="233.453125" y="414.419922"/> + <use xlink:href="#glyph0-28" x="237.453125" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="218.453125" y="445.900391"/> + <use xlink:href="#glyph0-22" x="223.453125" y="445.900391"/> + <use xlink:href="#glyph0-21" x="225.453125" y="445.900391"/> + <use xlink:href="#glyph0-11" x="230.453125" y="445.900391"/> + <use xlink:href="#glyph0-35" x="234.453125" y="445.900391"/> + <use xlink:href="#glyph0-6" x="240.453125" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="218.453125" y="477.380859"/> + <use xlink:href="#glyph0-30" x="224.453125" y="477.380859"/> + <use xlink:href="#glyph0-10" x="229.453125" y="477.380859"/> + <use xlink:href="#glyph0-27" x="232.453125" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="218.453125" y="508.865234"/> + <use xlink:href="#glyph0-30" x="224.453125" y="508.865234"/> + <use xlink:href="#glyph0-10" x="229.453125" y="508.865234"/> + <use xlink:href="#glyph0-27" x="232.453125" y="508.865234"/> + <use xlink:href="#glyph0-35" x="237.453125" y="508.865234"/> + <use xlink:href="#glyph0-6" x="243.453125" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="218.453125" y="540.345703"/> + <use xlink:href="#glyph0-5" x="224.453125" y="540.345703"/> + <use xlink:href="#glyph0-19" x="229.453125" y="540.345703"/> + <use xlink:href="#glyph0-33" x="234.453125" y="540.345703"/> + <use xlink:href="#glyph0-10" x="241.453125" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-33" x="218.453125" y="571.826172"/> + <use xlink:href="#glyph0-10" x="225.453125" y="571.826172"/> + <use xlink:href="#glyph0-35" x="228.453125" y="571.826172"/> + <use xlink:href="#glyph0-5" x="233.453125" y="571.826172"/> + <use xlink:href="#glyph0-6" x="238.453125" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(1.568627%,1.568627%,1.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 72.148438 L 231.785156 72.148438 L 231.785156 87.890625 L 218.453125 87.890625 Z M 218.453125 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(38.039216%,6.666667%,38.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 72.148438 L 245.117188 72.148438 L 245.117188 87.890625 L 231.785156 87.890625 Z M 231.785156 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(77.254902%,19.607843%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 72.148438 L 258.449219 72.148438 L 258.449219 87.890625 L 245.117188 87.890625 Z M 245.117188 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,58.039216%,13.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 72.148438 L 271.785156 72.148438 L 271.785156 87.890625 L 258.453125 87.890625 Z M 258.453125 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,99.607843%,61.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 72.148438 L 285.117188 72.148438 L 285.117188 87.890625 L 271.785156 87.890625 Z M 271.785156 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(2.745098%,2.745098%,2.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 103.628906 L 231.785156 103.628906 L 231.785156 119.371094 L 218.453125 119.371094 Z M 218.453125 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(41.176471%,0%,33.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 103.628906 L 245.117188 103.628906 L 245.117188 119.371094 L 231.785156 119.371094 Z M 231.785156 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(76.470588%,5.490196%,38.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 103.628906 L 258.449219 103.628906 L 258.449219 119.371094 L 245.117188 119.371094 Z M 245.117188 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,51.372549%,32.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 103.628906 L 271.785156 103.628906 L 271.785156 119.371094 L 258.453125 119.371094 Z M 258.453125 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(99.215686%,96.078431%,92.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 103.628906 L 285.117188 103.628906 L 285.117188 119.371094 L 271.785156 119.371094 Z M 271.785156 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(2.745098%,2.745098%,2.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 135.109375 L 231.785156 135.109375 L 231.785156 150.851562 L 218.453125 150.851562 Z M 218.453125 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(25.882353%,20.392157%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 135.109375 L 245.117188 135.109375 L 245.117188 150.851562 L 231.785156 150.851562 Z M 231.785156 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,49.803922%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 135.109375 L 258.449219 135.109375 L 258.449219 150.851562 L 245.117188 150.851562 Z M 245.117188 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(28.235294%,76.078431%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 135.109375 L 271.785156 135.109375 L 271.785156 150.851562 L 258.453125 150.851562 Z M 258.453125 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(87.843137%,96.862745%,88.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 135.109375 L 285.117188 135.109375 L 285.117188 150.851562 L 271.785156 150.851562 Z M 271.785156 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(5.490196%,24.705882%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 166.59375 L 231.785156 166.59375 L 231.785156 182.335938 L 218.453125 182.335938 Z M 218.453125 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(16.470588%,42.745098%,47.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 166.59375 L 245.117188 166.59375 L 245.117188 182.335938 L 231.785156 182.335938 Z M 231.785156 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(34.117647%,61.176471%,59.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 166.59375 L 258.449219 166.59375 L 258.449219 182.335938 L 245.117188 182.335938 Z M 245.117188 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(56.078431%,80%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 166.59375 L 271.785156 166.59375 L 271.785156 182.335938 L 258.453125 182.335938 Z M 258.453125 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(81.960784%,98.431373%,83.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 166.59375 L 285.117188 166.59375 L 285.117188 182.335938 L 271.785156 182.335938 Z M 271.785156 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,36.470588%,40.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 198.074219 L 231.785156 198.074219 L 231.785156 213.816406 L 218.453125 213.816406 Z M 218.453125 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(10.588235%,50.588235%,49.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 198.074219 L 245.117188 198.074219 L 245.117188 213.816406 L 231.785156 213.816406 Z M 231.785156 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(39.215686%,65.490196%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 198.074219 L 258.449219 198.074219 L 258.449219 213.816406 L 245.117188 213.816406 Z M 245.117188 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(62.352941%,80.784314%,72.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 198.074219 L 271.785156 198.074219 L 271.785156 213.816406 L 258.453125 213.816406 Z M 258.453125 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(87.843137%,94.901961%,90.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 198.074219 L 285.117188 198.074219 L 285.117188 213.816406 L 271.785156 213.816406 Z M 271.785156 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(7.843137%,31.372549%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 229.554688 L 231.785156 229.554688 L 231.785156 245.296875 L 218.453125 245.296875 Z M 218.453125 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(16.470588%,47.45098%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 229.554688 L 245.117188 229.554688 L 245.117188 245.296875 L 231.785156 245.296875 Z M 231.785156 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(29.803922%,63.921569%,56.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 229.554688 L 258.449219 229.554688 L 258.449219 245.296875 L 245.117188 245.296875 Z M 245.117188 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(50.588235%,79.215686%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 229.554688 L 271.785156 229.554688 L 271.785156 245.296875 L 258.453125 245.296875 Z M 258.453125 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,89.803922%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 229.554688 L 285.117188 229.554688 L 285.117188 245.296875 L 271.785156 245.296875 Z M 271.785156 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(16.470588%,33.72549%,46.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 261.035156 L 231.785156 261.035156 L 231.785156 276.777344 L 218.453125 276.777344 Z M 218.453125 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(23.137255%,50.196078%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 261.035156 L 245.117188 261.035156 L 245.117188 276.777344 L 231.785156 276.777344 Z M 231.785156 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(40.392157%,66.27451%,71.372549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 261.035156 L 258.449219 261.035156 L 258.449219 276.777344 L 245.117188 276.777344 Z M 245.117188 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(60%,81.176471%,81.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 261.035156 L 271.785156 261.035156 L 271.785156 276.777344 L 258.453125 276.777344 Z M 258.453125 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(82.352941%,93.333333%,91.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 261.035156 L 285.117188 261.035156 L 285.117188 276.777344 L 271.785156 276.777344 Z M 271.785156 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(9.019608%,49.803922%,59.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 292.519531 L 231.785156 292.519531 L 231.785156 308.261719 L 218.453125 308.261719 Z M 218.453125 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,64.313725%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 292.519531 L 245.117188 292.519531 L 245.117188 308.261719 L 231.785156 308.261719 Z M 231.785156 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(18.039216%,77.647059%,68.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 292.519531 L 258.449219 292.519531 L 258.449219 308.261719 L 245.117188 308.261719 Z M 245.117188 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(44.705882%,88.627451%,67.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 292.519531 L 271.785156 292.519531 L 271.785156 308.261719 L 258.453125 308.261719 Z M 258.453125 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(71.764706%,94.509804%,69.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 292.519531 L 285.117188 292.519531 L 285.117188 308.261719 L 271.785156 308.261719 Z M 271.785156 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(4.313725%,25.490196%,31.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 324 L 231.785156 324 L 231.785156 339.742188 L 218.453125 339.742188 Z M 218.453125 324 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,43.137255%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 324 L 245.117188 324 L 245.117188 339.742188 L 231.785156 339.742188 Z M 231.785156 324 "/> +<path style="fill-rule:nonzero;fill:rgb(19.607843%,61.568627%,51.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 324 L 258.449219 324 L 258.449219 339.742188 L 245.117188 339.742188 Z M 245.117188 324 "/> +<path style="fill-rule:nonzero;fill:rgb(50.196078%,79.215686%,56.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 324 L 271.785156 324 L 271.785156 339.742188 L 258.453125 339.742188 Z M 258.453125 324 "/> +<path style="fill-rule:nonzero;fill:rgb(83.137255%,95.294118%,63.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 324 L 285.117188 324 L 285.117188 339.742188 L 271.785156 339.742188 Z M 271.785156 324 "/> +<path style="fill-rule:nonzero;fill:rgb(18.039216%,30.980392%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 355.480469 L 231.785156 355.480469 L 231.785156 371.222656 L 218.453125 371.222656 Z M 218.453125 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,50.588235%,56.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 355.480469 L 245.117188 355.480469 L 245.117188 371.222656 L 231.785156 371.222656 Z M 231.785156 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(27.45098%,69.019608%,60.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 355.480469 L 258.449219 355.480469 L 258.449219 371.222656 L 245.117188 371.222656 Z M 245.117188 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(61.176471%,85.490196%,63.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 355.480469 L 271.785156 355.480469 L 271.785156 371.222656 L 258.453125 371.222656 Z M 258.453125 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,100%,68.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 355.480469 L 285.117188 355.480469 L 285.117188 371.222656 L 271.785156 371.222656 Z M 271.785156 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(14.509804%,33.72549%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 386.964844 L 231.785156 386.964844 L 231.785156 402.707031 L 218.453125 402.707031 Z M 218.453125 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,49.411765%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 386.964844 L 245.117188 386.964844 L 245.117188 402.707031 L 231.785156 402.707031 Z M 231.785156 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(9.019608%,65.490196%,49.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 386.964844 L 258.449219 386.964844 L 258.449219 402.707031 L 245.117188 402.707031 Z M 245.117188 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(50.980392%,80%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 386.964844 L 271.785156 386.964844 L 271.785156 402.707031 L 258.453125 402.707031 Z M 258.453125 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,93.72549%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 386.964844 L 285.117188 386.964844 L 285.117188 402.707031 L 271.785156 402.707031 Z M 271.785156 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,29.803922%,23.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 418.445312 L 231.785156 418.445312 L 231.785156 434.1875 L 218.453125 434.1875 Z M 218.453125 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,48.235294%,31.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 418.445312 L 245.117188 418.445312 L 245.117188 434.1875 L 231.785156 434.1875 Z M 231.785156 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,63.137255%,45.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 418.445312 L 258.449219 418.445312 L 258.449219 434.1875 L 245.117188 434.1875 Z M 245.117188 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,76.078431%,61.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 418.445312 L 271.785156 418.445312 L 271.785156 434.1875 L 258.453125 434.1875 Z M 258.453125 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(98.039216%,86.666667%,76.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 418.445312 L 285.117188 418.445312 L 285.117188 434.1875 L 271.785156 434.1875 Z M 271.785156 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,29.803922%,50.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 449.925781 L 231.785156 449.925781 L 231.785156 465.667969 L 218.453125 465.667969 Z M 218.453125 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,49.411765%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 449.925781 L 245.117188 449.925781 L 245.117188 465.667969 L 231.785156 465.667969 Z M 231.785156 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,66.27451%,44.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 449.925781 L 258.449219 449.925781 L 258.449219 465.667969 L 245.117188 465.667969 Z M 245.117188 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(98.039216%,81.960784%,54.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 449.925781 L 271.785156 449.925781 L 271.785156 465.667969 L 258.453125 465.667969 Z M 258.453125 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(99.215686%,96.470588%,70.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 449.925781 L 285.117188 449.925781 L 285.117188 465.667969 L 271.785156 465.667969 Z M 271.785156 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(40.392157%,13.333333%,24.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 481.40625 L 231.785156 481.40625 L 231.785156 497.148438 L 218.453125 497.148438 Z M 218.453125 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(61.176471%,24.313725%,36.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 481.40625 L 245.117188 481.40625 L 245.117188 497.148438 L 231.785156 497.148438 Z M 231.785156 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,38.431373%,48.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 481.40625 L 258.449219 481.40625 L 258.449219 497.148438 L 245.117188 497.148438 Z M 245.117188 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(90.196078%,58.431373%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 481.40625 L 271.785156 481.40625 L 271.785156 497.148438 L 258.453125 497.148438 Z M 258.453125 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,77.254902%,78.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 481.40625 L 285.117188 481.40625 L 285.117188 497.148438 L 271.785156 497.148438 Z M 271.785156 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(46.666667%,17.254902%,29.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 512.890625 L 231.785156 512.890625 L 231.785156 528.632812 L 218.453125 528.632812 Z M 218.453125 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,30.980392%,35.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 512.890625 L 245.117188 512.890625 L 245.117188 528.632812 L 231.785156 528.632812 Z M 231.785156 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,46.27451%,36.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 512.890625 L 258.449219 512.890625 L 258.449219 528.632812 L 245.117188 528.632812 Z M 245.117188 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,66.666667%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 512.890625 L 271.785156 512.890625 L 271.785156 528.632812 L 258.453125 528.632812 Z M 258.453125 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,87.45098%,75.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 512.890625 L 285.117188 512.890625 L 285.117188 528.632812 L 271.785156 528.632812 Z M 271.785156 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(69.411765%,24.705882%,38.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 544.371094 L 231.785156 544.371094 L 231.785156 560.113281 L 218.453125 560.113281 Z M 218.453125 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,36.470588%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 544.371094 L 245.117188 544.371094 L 245.117188 560.113281 L 231.785156 560.113281 Z M 231.785156 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(89.019608%,52.156863%,40%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 544.371094 L 258.449219 544.371094 L 258.449219 560.113281 L 245.117188 560.113281 Z M 245.117188 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(93.333333%,67.45098%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 544.371094 L 271.785156 544.371094 L 271.785156 560.113281 L 258.453125 560.113281 Z M 258.453125 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,81.960784%,65.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 544.371094 L 285.117188 544.371094 L 285.117188 560.113281 L 271.785156 560.113281 Z M 271.785156 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,28.235294%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 218.453125 575.851562 L 231.785156 575.851562 L 231.785156 591.59375 L 218.453125 591.59375 Z M 218.453125 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,45.490196%,30.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 231.785156 575.851562 L 245.117188 575.851562 L 245.117188 591.59375 L 231.785156 591.59375 Z M 231.785156 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,60.784314%,29.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 245.117188 575.851562 L 258.449219 575.851562 L 258.449219 591.59375 L 245.117188 591.59375 Z M 245.117188 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,73.72549%,41.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 258.453125 575.851562 L 271.785156 575.851562 L 271.785156 591.59375 L 258.453125 591.59375 Z M 258.453125 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(92.54902%,85.098039%,60%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 271.785156 575.851562 L 285.117188 575.851562 L 285.117188 591.59375 L 271.785156 591.59375 Z M 271.785156 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="319.167969" y="68.123047"/> + <use xlink:href="#glyph0-30" x="325.167969" y="68.123047"/> + <use xlink:href="#glyph0-10" x="330.167969" y="68.123047"/> + <use xlink:href="#glyph0-31" x="333.167969" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="319.167969" y="99.603516"/> + <use xlink:href="#glyph0-30" x="325.167969" y="99.603516"/> + <use xlink:href="#glyph0-10" x="330.167969" y="99.603516"/> + <use xlink:href="#glyph0-31" x="333.167969" y="99.603516"/> + <use xlink:href="#glyph0-33" x="338.167969" y="99.603516"/> + <use xlink:href="#glyph0-10" x="345.167969" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="319.167969" y="131.087891"/> + <use xlink:href="#glyph0-30" x="325.167969" y="131.087891"/> + <use xlink:href="#glyph0-21" x="330.167969" y="131.087891"/> + <use xlink:href="#glyph0-3" x="335.167969" y="131.087891"/> + <use xlink:href="#glyph0-5" x="339.167969" y="131.087891"/> + <use xlink:href="#glyph0-4" x="344.167969" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-41" x="319.167969" y="162.568359"/> + <use xlink:href="#glyph0-2" x="326.167969" y="162.568359"/> + <use xlink:href="#glyph0-27" x="331.167969" y="162.568359"/> + <use xlink:href="#glyph0-5" x="336.167969" y="162.568359"/> + <use xlink:href="#glyph0-21" x="341.167969" y="162.568359"/> + <use xlink:href="#glyph0-4" x="346.167969" y="162.568359"/> + <use xlink:href="#glyph0-2" x="348.167969" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="319.167969" y="194.048828"/> + <use xlink:href="#glyph0-30" x="325.167969" y="194.048828"/> + <use xlink:href="#glyph0-21" x="330.167969" y="194.048828"/> + <use xlink:href="#glyph0-3" x="335.167969" y="194.048828"/> + <use xlink:href="#glyph0-5" x="339.167969" y="194.048828"/> + <use xlink:href="#glyph0-4" x="344.167969" y="194.048828"/> + <use xlink:href="#glyph0-9" x="346.167969" y="194.048828"/> + <use xlink:href="#glyph0-2" x="352.167969" y="194.048828"/> + <use xlink:href="#glyph0-10" x="357.167969" y="194.048828"/> + <use xlink:href="#glyph0-11" x="360.167969" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-2" x="319.167969" y="225.529297"/> + <use xlink:href="#glyph0-27" x="324.167969" y="225.529297"/> + <use xlink:href="#glyph0-43" x="329.167969" y="225.529297"/> + <use xlink:href="#glyph0-14" x="334.167969" y="225.529297"/> + <use xlink:href="#glyph0-30" x="340.167969" y="225.529297"/> + <use xlink:href="#glyph0-21" x="345.167969" y="225.529297"/> + <use xlink:href="#glyph0-3" x="350.167969" y="225.529297"/> + <use xlink:href="#glyph0-5" x="354.167969" y="225.529297"/> + <use xlink:href="#glyph0-4" x="359.167969" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="319.167969" y="257.013672"/> + <use xlink:href="#glyph0-10" x="325.167969" y="257.013672"/> + <use xlink:href="#glyph0-36" x="328.167969" y="257.013672"/> + <use xlink:href="#glyph0-21" x="334.167969" y="257.013672"/> + <use xlink:href="#glyph0-35" x="339.167969" y="257.013672"/> + <use xlink:href="#glyph0-6" x="345.167969" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-35" x="319.167969" y="288.494141"/> + <use xlink:href="#glyph0-6" x="325.167969" y="288.494141"/> + <use xlink:href="#glyph0-33" x="327.167969" y="288.494141"/> + <use xlink:href="#glyph0-10" x="334.167969" y="288.494141"/> + <use xlink:href="#glyph0-32" x="337.167969" y="288.494141"/> + <use xlink:href="#glyph0-19" x="343.167969" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-35" x="319.167969" y="319.974609"/> + <use xlink:href="#glyph0-6" x="325.167969" y="319.974609"/> + <use xlink:href="#glyph0-33" x="327.167969" y="319.974609"/> + <use xlink:href="#glyph0-10" x="334.167969" y="319.974609"/> + <use xlink:href="#glyph0-29" x="337.167969" y="319.974609"/> + <use xlink:href="#glyph0-10" x="343.167969" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-33" x="319.167969" y="351.455078"/> + <use xlink:href="#glyph0-10" x="326.167969" y="351.455078"/> + <use xlink:href="#glyph0-32" x="329.167969" y="351.455078"/> + <use xlink:href="#glyph0-19" x="335.167969" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-33" x="319.167969" y="382.939453"/> + <use xlink:href="#glyph0-10" x="326.167969" y="382.939453"/> + <use xlink:href="#glyph0-2" x="329.167969" y="382.939453"/> + <use xlink:href="#glyph0-21" x="334.167969" y="382.939453"/> + <use xlink:href="#glyph0-27" x="339.167969" y="382.939453"/> + <use xlink:href="#glyph0-5" x="344.167969" y="382.939453"/> + <use xlink:href="#glyph0-3" x="349.167969" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-35" x="319.167969" y="414.419922"/> + <use xlink:href="#glyph0-6" x="325.167969" y="414.419922"/> + <use xlink:href="#glyph0-25" x="327.167969" y="414.419922"/> + <use xlink:href="#glyph0-21" x="334.167969" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-35" x="319.167969" y="445.900391"/> + <use xlink:href="#glyph0-6" x="325.167969" y="445.900391"/> + <use xlink:href="#glyph0-25" x="327.167969" y="445.900391"/> + <use xlink:href="#glyph0-21" x="334.167969" y="445.900391"/> + <use xlink:href="#glyph0-29" x="339.167969" y="445.900391"/> + <use xlink:href="#glyph0-30" x="345.167969" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="319.167969" y="477.380859"/> + <use xlink:href="#glyph0-5" x="325.167969" y="477.380859"/> + <use xlink:href="#glyph0-19" x="330.167969" y="477.380859"/> + <use xlink:href="#glyph0-3" x="335.167969" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="319.167969" y="508.865234"/> + <use xlink:href="#glyph0-19" x="325.167969" y="508.865234"/> + <use xlink:href="#glyph0-1" x="330.167969" y="508.865234"/> + <use xlink:href="#glyph0-30" x="336.167969" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="319.167969" y="540.345703"/> + <use xlink:href="#glyph0-30" x="325.167969" y="540.345703"/> + <use xlink:href="#glyph0-32" x="330.167969" y="540.345703"/> + <use xlink:href="#glyph0-19" x="336.167969" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="319.167969" y="571.826172"/> + <use xlink:href="#glyph0-30" x="325.167969" y="571.826172"/> + <use xlink:href="#glyph0-10" x="330.167969" y="571.826172"/> + <use xlink:href="#glyph0-31" x="333.167969" y="571.826172"/> + <use xlink:href="#glyph0-6" x="338.167969" y="571.826172"/> + <use xlink:href="#glyph0-5" x="340.167969" y="571.826172"/> + <use xlink:href="#glyph0-3" x="345.167969" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(39.215686%,35.294118%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 72.148438 L 332.5 72.148438 L 332.5 87.890625 L 319.167969 87.890625 Z M 319.167969 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(56.078431%,45.882353%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 72.148438 L 345.832031 72.148438 L 345.832031 87.890625 L 332.5 87.890625 Z M 332.5 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(71.372549%,58.823529%,83.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 72.148438 L 359.164062 72.148438 L 359.164062 87.890625 L 345.832031 87.890625 Z M 345.832031 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,72.54902%,92.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 72.148438 L 372.5 72.148438 L 372.5 87.890625 L 359.167969 87.890625 Z M 359.167969 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,88.627451%,98.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 72.148438 L 385.832031 72.148438 L 385.832031 87.890625 L 372.5 87.890625 Z M 372.5 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(34.509804%,23.529412%,53.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 103.628906 L 332.5 103.628906 L 332.5 119.371094 L 319.167969 119.371094 Z M 319.167969 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(61.568627%,31.372549%,65.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 103.628906 L 345.832031 103.628906 L 345.832031 119.371094 L 332.5 119.371094 Z M 332.5 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(80%,47.058824%,68.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 103.628906 L 359.164062 103.628906 L 359.164062 119.371094 L 345.832031 119.371094 Z M 345.832031 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,65.490196%,72.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 103.628906 L 372.5 103.628906 L 372.5 119.371094 L 359.167969 119.371094 Z M 359.167969 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,86.27451%,85.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 103.628906 L 385.832031 103.628906 L 385.832031 119.371094 L 372.5 119.371094 Z M 372.5 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(43.921569%,30.196078%,61.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 135.109375 L 332.5 135.109375 L 332.5 150.851562 L 319.167969 150.851562 Z M 319.167969 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(73.72549%,35.294118%,66.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 135.109375 L 345.832031 135.109375 L 345.832031 150.851562 L 332.5 150.851562 Z M 332.5 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,48.627451%,59.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 135.109375 L 359.164062 135.109375 L 359.164062 150.851562 L 345.832031 150.851562 Z M 345.832031 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,69.803922%,50.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 135.109375 L 372.5 135.109375 L 372.5 150.851562 L 359.167969 150.851562 Z M 359.167969 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,90.588235%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 135.109375 L 385.832031 135.109375 L 385.832031 150.851562 L 372.5 150.851562 Z M 372.5 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(42.745098%,10.980392%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 166.59375 L 332.5 166.59375 L 332.5 182.335938 L 319.167969 182.335938 Z M 319.167969 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(61.960784%,26.27451%,52.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 166.59375 L 345.832031 166.59375 L 345.832031 182.335938 L 332.5 182.335938 Z M 332.5 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,42.352941%,63.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 166.59375 L 359.164062 166.59375 L 359.164062 182.335938 L 345.832031 182.335938 Z M 345.832031 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,60.784314%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 166.59375 L 372.5 166.59375 L 372.5 182.335938 L 359.167969 182.335938 Z M 359.167969 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,79.215686%,82.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 166.59375 L 385.832031 166.59375 L 385.832031 182.335938 L 372.5 182.335938 Z M 372.5 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,11.372549%,40.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 198.074219 L 332.5 198.074219 L 332.5 213.816406 L 319.167969 213.816406 Z M 319.167969 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(76.078431%,16.862745%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 198.074219 L 345.832031 198.074219 L 345.832031 213.816406 L 332.5 213.816406 Z M 332.5 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,35.294118%,42.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 198.074219 L 359.164062 198.074219 L 359.164062 213.816406 L 345.832031 213.816406 Z M 345.832031 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,62.745098%,46.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 198.074219 L 372.5 198.074219 L 372.5 213.816406 L 359.167969 213.816406 Z M 359.167969 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,85.098039%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 198.074219 L 385.832031 198.074219 L 385.832031 213.816406 L 372.5 213.816406 Z M 372.5 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(29.411765%,11.372549%,56.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 229.554688 L 332.5 229.554688 L 332.5 245.296875 L 319.167969 245.296875 Z M 319.167969 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(65.882353%,7.45098%,61.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 229.554688 L 345.832031 229.554688 L 345.832031 245.296875 L 332.5 245.296875 Z M 332.5 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(89.803922%,27.843137%,52.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 229.554688 L 359.164062 229.554688 L 359.164062 245.296875 L 345.832031 245.296875 Z M 345.832031 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,57.647059%,37.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 229.554688 L 372.5 229.554688 L 372.5 245.296875 L 359.167969 245.296875 Z M 359.167969 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(90.588235%,82.745098%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 229.554688 L 385.832031 229.554688 L 385.832031 245.296875 L 372.5 245.296875 Z M 372.5 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(32.941176%,10.980392%,22.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 261.035156 L 332.5 261.035156 L 332.5 276.777344 L 319.167969 276.777344 Z M 319.167969 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(55.294118%,27.45098%,32.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 261.035156 L 345.832031 261.035156 L 345.832031 276.777344 L 332.5 276.777344 Z M 332.5 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(74.117647%,47.058824%,39.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 261.035156 L 359.164062 261.035156 L 359.164062 276.777344 L 345.832031 276.777344 Z M 345.832031 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,69.411765%,56.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 261.035156 L 372.5 261.035156 L 372.5 276.777344 L 359.167969 276.777344 Z M 359.167969 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(92.156863%,88.627451%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 261.035156 L 385.832031 261.035156 L 385.832031 276.777344 L 372.5 276.777344 Z M 372.5 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,0%,14.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 292.519531 L 332.5 292.519531 L 332.5 308.261719 L 319.167969 308.261719 Z M 319.167969 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,20.784314%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 292.519531 L 345.832031 292.519531 L 345.832031 308.261719 L 332.5 308.261719 Z M 332.5 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,57.647059%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 292.519531 L 359.164062 292.519531 L 359.164062 308.261719 L 345.832031 308.261719 Z M 345.832031 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,83.921569%,49.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 292.519531 L 372.5 292.519531 L 372.5 308.261719 L 359.167969 308.261719 Z M 359.167969 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,100%,78.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 292.519531 L 385.832031 292.519531 L 385.832031 308.261719 L 372.5 308.261719 Z M 372.5 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(40.784314%,15.294118%,7.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 324 L 332.5 324 L 332.5 339.742188 L 319.167969 339.742188 Z M 319.167969 324 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,36.078431%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 324 L 345.832031 324 L 345.832031 339.742188 L 332.5 339.742188 Z M 332.5 324 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,64.313725%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 324 L 359.164062 324 L 359.164062 339.742188 L 345.832031 339.742188 Z M 345.832031 324 "/> +<path style="fill-rule:nonzero;fill:rgb(98.039216%,87.843137%,58.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 324 L 372.5 324 L 372.5 339.742188 L 359.167969 339.742188 Z M 359.167969 324 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.607843%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 324 L 385.832031 324 L 385.832031 339.742188 L 372.5 339.742188 Z M 372.5 324 "/> +<path style="fill-rule:nonzero;fill:rgb(53.333333%,0%,17.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 355.480469 L 332.5 355.480469 L 332.5 371.222656 L 319.167969 371.222656 Z M 319.167969 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(86.666667%,23.137255%,14.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 355.480469 L 345.832031 355.480469 L 345.832031 371.222656 L 332.5 371.222656 Z M 332.5 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,58.039216%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 355.480469 L 359.164062 355.480469 L 359.164062 371.222656 L 345.832031 371.222656 Z M 345.832031 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,82.745098%,65.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 355.480469 L 372.5 355.480469 L 372.5 371.222656 L 359.167969 371.222656 Z M 359.167969 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(99.215686%,96.078431%,92.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 355.480469 L 385.832031 355.480469 L 385.832031 371.222656 L 372.5 371.222656 Z M 372.5 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(50.196078%,16.470588%,2.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 386.964844 L 332.5 386.964844 L 332.5 402.707031 L 319.167969 402.707031 Z M 319.167969 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,31.372549%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 386.964844 L 345.832031 386.964844 L 345.832031 402.707031 L 332.5 402.707031 Z M 332.5 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(96.862745%,57.254902%,11.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 386.964844 L 359.164062 386.964844 L 359.164062 402.707031 L 345.832031 402.707031 Z M 345.832031 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,80.392157%,63.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 386.964844 L 372.5 386.964844 L 372.5 402.707031 L 359.167969 402.707031 Z M 359.167969 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,96.078431%,92.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 386.964844 L 385.832031 386.964844 L 385.832031 402.707031 L 372.5 402.707031 Z M 372.5 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,27.058824%,20%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 418.445312 L 332.5 418.445312 L 332.5 434.1875 L 319.167969 434.1875 Z M 319.167969 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(15.294118%,55.686275%,34.117647%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 418.445312 L 345.832031 418.445312 L 345.832031 434.1875 L 332.5 434.1875 Z M 332.5 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(52.156863%,78.431373%,46.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 418.445312 L 359.164062 418.445312 L 359.164062 434.1875 L 345.832031 434.1875 Z M 345.832031 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(84.705882%,92.941176%,71.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 418.445312 L 372.5 418.445312 L 372.5 434.1875 L 359.167969 434.1875 Z M 359.167969 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.607843%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 418.445312 L 385.832031 418.445312 L 385.832031 434.1875 L 372.5 434.1875 Z M 372.5 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(14.901961%,9.411765%,37.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 449.925781 L 332.5 449.925781 L 332.5 465.667969 L 319.167969 465.667969 Z M 319.167969 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,49.411765%,70.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 449.925781 L 345.832031 449.925781 L 345.832031 465.667969 L 332.5 465.667969 Z M 332.5 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(9.411765%,74.117647%,69.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 449.925781 L 359.164062 449.925781 L 359.164062 465.667969 L 345.832031 465.667969 Z M 345.832031 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(73.72549%,91.372549%,77.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 449.925781 L 372.5 449.925781 L 372.5 465.667969 L 359.167969 465.667969 Z M 359.167969 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,100%,86.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 449.925781 L 385.832031 449.925781 L 385.832031 465.667969 L 372.5 465.667969 Z M 372.5 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(42.745098%,0%,14.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 481.40625 L 332.5 481.40625 L 332.5 497.148438 L 319.167969 497.148438 Z M 319.167969 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(80%,10.196078%,21.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 481.40625 L 345.832031 481.40625 L 345.832031 497.148438 L 332.5 497.148438 Z M 332.5 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,45.882353%,37.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 481.40625 L 359.164062 481.40625 L 359.164062 497.148438 L 345.832031 497.148438 Z M 345.832031 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,75.686275%,67.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 481.40625 L 372.5 481.40625 L 372.5 497.148438 L 359.167969 497.148438 Z M 359.167969 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,96.078431%,94.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 481.40625 L 385.832031 481.40625 L 385.832031 497.148438 L 372.5 497.148438 Z M 372.5 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(28.627451%,0%,38.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 512.890625 L 332.5 512.890625 L 332.5 528.632812 L 319.167969 528.632812 Z M 319.167969 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(66.666667%,10.980392%,59.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 512.890625 L 345.832031 512.890625 L 345.832031 528.632812 L 332.5 528.632812 Z M 332.5 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,43.921569%,66.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 512.890625 L 359.164062 512.890625 L 359.164062 528.632812 L 345.832031 528.632812 Z M 345.832031 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,75.294118%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 512.890625 L 372.5 512.890625 L 372.5 528.632812 L 359.167969 528.632812 Z M 359.167969 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,96.078431%,94.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 512.890625 L 385.832031 512.890625 L 385.832031 528.632812 L 372.5 528.632812 Z M 372.5 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(38.039216%,7.45098%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 544.371094 L 332.5 544.371094 L 332.5 560.113281 L 319.167969 560.113281 Z M 319.167969 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(83.529412%,0%,41.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 544.371094 L 345.832031 544.371094 L 345.832031 560.113281 L 332.5 560.113281 Z M 332.5 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,41.568627%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 544.371094 L 359.164062 544.371094 L 359.164062 560.113281 L 345.832031 560.113281 Z M 345.832031 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(84.313725%,74.901961%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 544.371094 L 372.5 544.371094 L 372.5 560.113281 L 359.167969 560.113281 Z M 359.167969 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,98.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 544.371094 L 385.832031 544.371094 L 385.832031 560.113281 L 372.5 560.113281 Z M 372.5 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(23.921569%,9.019608%,47.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 319.167969 575.851562 L 332.5 575.851562 L 332.5 591.59375 L 319.167969 591.59375 Z M 319.167969 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(44.313725%,36.470588%,66.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 332.5 575.851562 L 345.832031 575.851562 L 345.832031 591.59375 L 332.5 591.59375 Z M 332.5 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(65.098039%,61.568627%,80%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 345.832031 575.851562 L 359.164062 575.851562 L 359.164062 591.59375 L 345.832031 591.59375 Z M 345.832031 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(84.705882%,83.137255%,92.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 359.167969 575.851562 L 372.5 575.851562 L 372.5 591.59375 L 359.167969 591.59375 Z M 359.167969 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,98.431373%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 372.5 575.851562 L 385.832031 575.851562 L 385.832031 591.59375 L 372.5 591.59375 Z M 372.5 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="419.882812" y="68.123047"/> + <use xlink:href="#glyph0-30" x="425.882812" y="68.123047"/> + <use xlink:href="#glyph0-29" x="430.882812" y="68.123047"/> + <use xlink:href="#glyph0-30" x="436.882812" y="68.123047"/> + <use xlink:href="#glyph0-25" x="441.882812" y="68.123047"/> + <use xlink:href="#glyph0-21" x="448.882812" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="419.882812" y="99.603516"/> + <use xlink:href="#glyph0-30" x="425.882812" y="99.603516"/> + <use xlink:href="#glyph0-29" x="430.882812" y="99.603516"/> + <use xlink:href="#glyph0-30" x="436.882812" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="419.882812" y="131.087891"/> + <use xlink:href="#glyph0-10" x="426.882812" y="131.087891"/> + <use xlink:href="#glyph0-5" x="429.882812" y="131.087891"/> + <use xlink:href="#glyph0-5" x="434.882812" y="131.087891"/> + <use xlink:href="#glyph0-21" x="439.882812" y="131.087891"/> + <use xlink:href="#glyph0-3" x="444.882812" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="162.568359"/> + <use xlink:href="#glyph0-30" x="425.882812" y="162.568359"/> + <use xlink:href="#glyph0-25" x="430.882812" y="162.568359"/> + <use xlink:href="#glyph0-21" x="437.882812" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="419.882812" y="194.048828"/> + <use xlink:href="#glyph0-21" x="426.882812" y="194.048828"/> + <use xlink:href="#glyph0-29" x="431.882812" y="194.048828"/> + <use xlink:href="#glyph0-30" x="437.882812" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="225.529297"/> + <use xlink:href="#glyph0-30" x="425.882812" y="225.529297"/> + <use xlink:href="#glyph0-1" x="430.882812" y="225.529297"/> + <use xlink:href="#glyph0-30" x="436.882812" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="257.013672"/> + <use xlink:href="#glyph0-6" x="425.882812" y="257.013672"/> + <use xlink:href="#glyph0-30" x="427.882812" y="257.013672"/> + <use xlink:href="#glyph0-5" x="432.882812" y="257.013672"/> + <use xlink:href="#glyph0-3" x="437.882812" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-26" x="419.882812" y="288.494141"/> + <use xlink:href="#glyph0-2" x="424.882812" y="288.494141"/> + <use xlink:href="#glyph0-44" x="429.882812" y="288.494141"/> + <use xlink:href="#glyph0-18" x="431.882812" y="288.494141"/> + <use xlink:href="#glyph0-6" x="436.882812" y="288.494141"/> + <use xlink:href="#glyph0-6" x="438.882812" y="288.494141"/> + <use xlink:href="#glyph0-2" x="440.882812" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="419.882812" y="319.974609"/> + <use xlink:href="#glyph0-30" x="423.882812" y="319.974609"/> + <use xlink:href="#glyph0-10" x="428.882812" y="319.974609"/> + <use xlink:href="#glyph0-11" x="431.882812" y="319.974609"/> + <use xlink:href="#glyph0-30" x="435.882812" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-20" x="419.882812" y="351.455078"/> + <use xlink:href="#glyph0-2" x="425.882812" y="351.455078"/> + <use xlink:href="#glyph0-36" x="430.882812" y="351.455078"/> + <use xlink:href="#glyph0-2" x="436.882812" y="351.455078"/> + <use xlink:href="#glyph0-22" x="441.882812" y="351.455078"/> + <use xlink:href="#glyph0-22" x="443.882812" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="382.939453"/> + <use xlink:href="#glyph0-2" x="425.882812" y="382.939453"/> + <use xlink:href="#glyph0-4" x="430.882812" y="382.939453"/> + <use xlink:href="#glyph0-6" x="432.882812" y="382.939453"/> + <use xlink:href="#glyph0-18" x="434.882812" y="382.939453"/> + <use xlink:href="#glyph0-36" x="439.882812" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="414.419922"/> + <use xlink:href="#glyph0-6" x="425.882812" y="414.419922"/> + <use xlink:href="#glyph0-30" x="427.882812" y="414.419922"/> + <use xlink:href="#glyph0-5" x="432.882812" y="414.419922"/> + <use xlink:href="#glyph0-34" x="437.882812" y="414.419922"/> + <use xlink:href="#glyph0-32" x="440.882812" y="414.419922"/> + <use xlink:href="#glyph0-5" x="446.882812" y="414.419922"/> + <use xlink:href="#glyph0-19" x="451.882812" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="445.900391"/> + <use xlink:href="#glyph0-6" x="425.882812" y="445.900391"/> + <use xlink:href="#glyph0-30" x="427.882812" y="445.900391"/> + <use xlink:href="#glyph0-5" x="432.882812" y="445.900391"/> + <use xlink:href="#glyph0-34" x="437.882812" y="445.900391"/> + <use xlink:href="#glyph0-32" x="440.882812" y="445.900391"/> + <use xlink:href="#glyph0-5" x="446.882812" y="445.900391"/> + <use xlink:href="#glyph0-19" x="451.882812" y="445.900391"/> + <use xlink:href="#glyph0-7" x="456.882812" y="445.900391"/> + <use xlink:href="#glyph0-12" x="458.882812" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="419.882812" y="477.380859"/> + <use xlink:href="#glyph0-6" x="425.882812" y="477.380859"/> + <use xlink:href="#glyph0-30" x="427.882812" y="477.380859"/> + <use xlink:href="#glyph0-5" x="432.882812" y="477.380859"/> + <use xlink:href="#glyph0-34" x="437.882812" y="477.380859"/> + <use xlink:href="#glyph0-32" x="440.882812" y="477.380859"/> + <use xlink:href="#glyph0-5" x="446.882812" y="477.380859"/> + <use xlink:href="#glyph0-19" x="451.882812" y="477.380859"/> + <use xlink:href="#glyph0-7" x="456.882812" y="477.380859"/> + <use xlink:href="#glyph0-13" x="458.882812" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="419.882812" y="508.865234"/> + <use xlink:href="#glyph0-5" x="425.882812" y="508.865234"/> + <use xlink:href="#glyph0-19" x="430.882812" y="508.865234"/> + <use xlink:href="#glyph0-34" x="435.882812" y="508.865234"/> + <use xlink:href="#glyph0-25" x="438.882812" y="508.865234"/> + <use xlink:href="#glyph0-10" x="445.882812" y="508.865234"/> + <use xlink:href="#glyph0-5" x="448.882812" y="508.865234"/> + <use xlink:href="#glyph0-5" x="453.882812" y="508.865234"/> + <use xlink:href="#glyph0-21" x="458.882812" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="419.882812" y="540.345703"/> + <use xlink:href="#glyph0-30" x="425.882812" y="540.345703"/> + <use xlink:href="#glyph0-10" x="430.882812" y="540.345703"/> + <use xlink:href="#glyph0-31" x="433.882812" y="540.345703"/> + <use xlink:href="#glyph0-6" x="438.882812" y="540.345703"/> + <use xlink:href="#glyph0-5" x="440.882812" y="540.345703"/> + <use xlink:href="#glyph0-34" x="445.882812" y="540.345703"/> + <use xlink:href="#glyph0-25" x="448.882812" y="540.345703"/> + <use xlink:href="#glyph0-10" x="455.882812" y="540.345703"/> + <use xlink:href="#glyph0-5" x="458.882812" y="540.345703"/> + <use xlink:href="#glyph0-5" x="463.882812" y="540.345703"/> + <use xlink:href="#glyph0-21" x="468.882812" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="419.882812" y="571.826172"/> + <use xlink:href="#glyph0-30" x="425.882812" y="571.826172"/> + <use xlink:href="#glyph0-10" x="430.882812" y="571.826172"/> + <use xlink:href="#glyph0-31" x="433.882812" y="571.826172"/> + <use xlink:href="#glyph0-6" x="438.882812" y="571.826172"/> + <use xlink:href="#glyph0-5" x="440.882812" y="571.826172"/> + <use xlink:href="#glyph0-34" x="445.882812" y="571.826172"/> + <use xlink:href="#glyph0-29" x="448.882812" y="571.826172"/> + <use xlink:href="#glyph0-10" x="454.882812" y="571.826172"/> + <use xlink:href="#glyph0-18" x="457.882812" y="571.826172"/> + <use xlink:href="#glyph0-36" x="462.882812" y="571.826172"/> + <use xlink:href="#glyph0-21" x="468.882812" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(0%,27.058824%,20%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 72.148438 L 433.214844 72.148438 L 433.214844 87.890625 L 419.882812 87.890625 Z M 419.882812 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,50.980392%,54.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 72.148438 L 446.546875 72.148438 L 446.546875 87.890625 L 433.214844 87.890625 Z M 433.214844 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(46.27451%,65.098039%,81.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 72.148438 L 459.878906 72.148438 L 459.878906 87.890625 L 446.546875 87.890625 Z M 446.546875 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(84.313725%,80.784314%,91.372549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 72.148438 L 473.214844 72.148438 L 473.214844 87.890625 L 459.882812 87.890625 Z M 459.882812 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,96.862745%,99.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 72.148438 L 486.546875 72.148438 L 486.546875 87.890625 L 473.214844 87.890625 Z M 473.214844 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(5.490196%,24.705882%,36.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 103.628906 L 433.214844 103.628906 L 433.214844 119.371094 L 419.882812 119.371094 Z M 419.882812 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(6.666667%,45.098039%,69.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 103.628906 L 446.546875 103.628906 L 446.546875 119.371094 L 433.214844 119.371094 Z M 433.214844 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(53.72549%,63.529412%,80.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 103.628906 L 459.878906 103.628906 L 459.878906 119.371094 L 446.546875 119.371094 Z M 446.546875 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,82.352941%,90.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 103.628906 L 473.214844 103.628906 L 473.214844 119.371094 L 459.882812 119.371094 Z M 459.882812 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,97.647059%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 103.628906 L 486.546875 103.628906 L 486.546875 119.371094 L 473.214844 119.371094 Z M 473.214844 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,27.45098%,8.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 135.109375 L 433.214844 135.109375 L 433.214844 150.851562 L 419.882812 150.851562 Z M 419.882812 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(18.823529%,53.72549%,23.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 135.109375 L 446.546875 135.109375 L 446.546875 150.851562 L 433.214844 150.851562 Z M 433.214844 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(50.588235%,75.294118%,47.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 135.109375 L 459.878906 135.109375 L 459.878906 150.851562 L 446.546875 150.851562 Z M 446.546875 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(79.215686%,90.980392%,75.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 135.109375 L 473.214844 135.109375 L 473.214844 150.851562 L 459.882812 150.851562 Z M 459.882812 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,98.431373%,95.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 135.109375 L 486.546875 135.109375 L 486.546875 150.851562 L 473.214844 150.851562 Z M 473.214844 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(10.588235%,26.666667%,7.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 166.59375 L 433.214844 166.59375 L 433.214844 182.335938 L 419.882812 182.335938 Z M 419.882812 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,56.470588%,32.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 166.59375 L 446.546875 166.59375 L 446.546875 182.335938 L 433.214844 182.335938 Z M 433.214844 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(43.921569%,77.254902%,67.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 166.59375 L 459.878906 166.59375 L 459.878906 182.335938 L 446.546875 182.335938 Z M 446.546875 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(77.647059%,91.764706%,89.803922%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 166.59375 L 473.214844 166.59375 L 473.214844 182.335938 L 459.882812 182.335938 Z M 459.882812 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,98.431373%,98.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 166.59375 L 486.546875 166.59375 L 486.546875 182.335938 L 473.214844 182.335938 Z M 473.214844 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(18.431373%,19.607843%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 198.074219 L 433.214844 198.074219 L 433.214844 213.816406 L 419.882812 213.816406 Z M 419.882812 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,56.470588%,72.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 198.074219 L 446.546875 198.074219 L 446.546875 213.816406 L 433.214844 213.816406 Z M 433.214844 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(32.941176%,79.215686%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 198.074219 L 459.878906 198.074219 L 459.878906 213.816406 L 446.546875 213.816406 Z M 446.546875 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,92.54902%,81.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 198.074219 L 473.214844 198.074219 L 473.214844 213.816406 L 459.882812 213.816406 Z M 459.882812 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,97.254902%,91.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 198.074219 L 486.546875 198.074219 L 486.546875 213.816406 L 473.214844 213.816406 Z M 473.214844 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(32.941176%,0%,27.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 229.554688 L 433.214844 229.554688 L 433.214844 245.296875 L 419.882812 245.296875 Z M 419.882812 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(51.372549%,27.45098%,63.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 229.554688 L 446.546875 229.554688 L 446.546875 245.296875 L 433.214844 245.296875 Z M 433.214844 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(56.470588%,60%,79.215686%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 229.554688 L 459.878906 229.554688 L 459.878906 245.296875 L 446.546875 245.296875 Z M 446.546875 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(74.509804%,83.921569%,90.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 229.554688 L 473.214844 229.554688 L 473.214844 245.296875 L 459.882812 245.296875 Z M 459.882812 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,98.431373%,98.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 229.554688 L 486.546875 229.554688 L 486.546875 245.296875 L 473.214844 245.296875 Z M 473.214844 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(15.294118%,21.960784%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 261.035156 L 433.214844 261.035156 L 433.214844 276.777344 L 419.882812 276.777344 Z M 419.882812 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(20.784314%,45.098039%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 261.035156 L 446.546875 261.035156 L 446.546875 276.777344 L 433.214844 276.777344 Z M 433.214844 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(49.803922%,67.058824%,82.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 261.035156 L 459.878906 261.035156 L 459.878906 276.777344 L 446.546875 276.777344 Z M 446.546875 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(75.686275%,85.882353%,92.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 261.035156 L 473.214844 261.035156 L 473.214844 276.777344 L 459.882812 276.777344 Z M 459.882812 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(95.686275%,98.039216%,99.607843%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 261.035156 L 486.546875 261.035156 L 486.546875 276.777344 L 473.214844 276.777344 Z M 473.214844 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,100%,78.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 292.519531 L 433.214844 292.519531 L 433.214844 308.261719 L 419.882812 308.261719 Z M 419.882812 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(90.980392%,75.686275%,40.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 292.519531 L 446.546875 292.519531 L 446.546875 308.261719 L 433.214844 308.261719 Z M 433.214844 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,45.882353%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 292.519531 L 459.878906 292.519531 L 459.878906 308.261719 L 446.546875 308.261719 Z M 446.546875 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(56.862745%,21.176471%,25.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 292.519531 L 473.214844 292.519531 L 473.214844 308.261719 L 459.882812 308.261719 Z M 459.882812 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(11.372549%,4.313725%,7.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 292.519531 L 486.546875 292.519531 L 486.546875 308.261719 L 473.214844 308.261719 Z M 473.214844 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,91.372549%,91.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 324 L 433.214844 324 L 433.214844 339.742188 L 419.882812 339.742188 Z M 419.882812 324 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,67.843137%,53.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 324 L 446.546875 324 L 446.546875 339.742188 L 433.214844 339.742188 Z M 433.214844 324 "/> +<path style="fill-rule:nonzero;fill:rgb(57.254902%,50.980392%,38.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 324 L 459.878906 324 L 459.878906 339.742188 L 446.546875 339.742188 Z M 446.546875 324 "/> +<path style="fill-rule:nonzero;fill:rgb(29.411765%,29.803922%,25.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 324 L 473.214844 324 L 473.214844 339.742188 L 459.882812 339.742188 Z M 459.882812 324 "/> +<path style="fill-rule:nonzero;fill:rgb(1.568627%,1.568627%,1.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 324 L 486.546875 324 L 486.546875 339.742188 L 473.214844 339.742188 Z M 473.214844 324 "/> +<path style="fill-rule:nonzero;fill:rgb(54.509804%,0%,41.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 355.480469 L 433.214844 355.480469 L 433.214844 371.222656 L 419.882812 371.222656 Z M 419.882812 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,33.333333%,16.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 355.480469 L 446.546875 355.480469 L 446.546875 371.222656 L 433.214844 371.222656 Z M 433.214844 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(60.392157%,59.607843%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 355.480469 L 459.878906 355.480469 L 459.878906 371.222656 L 446.546875 371.222656 Z M 446.546875 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(36.470588%,82.352941%,56.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 355.480469 L 473.214844 355.480469 L 473.214844 371.222656 L 459.882812 371.222656 Z M 459.882812 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(69.019608%,95.686275%,98.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 355.480469 L 486.546875 355.480469 L 486.546875 371.222656 L 473.214844 371.222656 Z M 473.214844 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(12.54902%,6.666667%,34.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 386.964844 L 433.214844 386.964844 L 433.214844 402.707031 L 419.882812 402.707031 Z M 419.882812 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,36.862745%,36.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 386.964844 L 446.546875 386.964844 L 446.546875 402.707031 L 433.214844 402.707031 Z M 433.214844 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(34.117647%,54.509804%,12.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 386.964844 L 459.878906 386.964844 L 459.878906 402.707031 L 446.546875 402.707031 Z M 446.546875 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(90.980392%,61.960784%,41.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 386.964844 L 473.214844 386.964844 L 473.214844 402.707031 L 459.882812 402.707031 Z M 459.882812 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,80.784314%,95.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 386.964844 L 486.546875 386.964844 L 486.546875 402.707031 L 473.214844 402.707031 Z M 473.214844 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,24.705882%,64.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 418.445312 L 433.214844 418.445312 L 433.214844 434.1875 L 419.882812 434.1875 Z M 419.882812 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(63.137255%,65.098039%,78.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 418.445312 L 446.546875 418.445312 L 446.546875 434.1875 L 433.214844 434.1875 Z M 433.214844 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 418.445312 L 459.878906 418.445312 L 459.878906 434.1875 L 446.546875 434.1875 Z M 446.546875 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(79.215686%,61.176471%,64.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 418.445312 L 473.214844 418.445312 L 473.214844 434.1875 L 459.882812 434.1875 Z M 459.882812 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(55.686275%,2.352941%,23.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 418.445312 L 486.546875 418.445312 L 486.546875 434.1875 L 473.214844 434.1875 Z M 473.214844 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(29.019608%,43.529412%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 449.925781 L 433.214844 449.925781 L 433.214844 465.667969 L 419.882812 465.667969 Z M 419.882812 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(61.568627%,65.882353%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 449.925781 L 446.546875 449.925781 L 446.546875 465.667969 L 433.214844 465.667969 Z M 433.214844 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 449.925781 L 459.878906 449.925781 L 459.878906 465.667969 L 446.546875 465.667969 Z M 446.546875 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(89.411765%,58.431373%,64.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 449.925781 L 473.214844 449.925781 L 473.214844 465.667969 L 459.882812 465.667969 Z M 459.882812 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,24.705882%,41.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 449.925781 L 486.546875 449.925781 L 486.546875 465.667969 L 473.214844 465.667969 Z M 473.214844 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,18.431373%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 481.40625 L 433.214844 481.40625 L 433.214844 497.148438 L 419.882812 497.148438 Z M 419.882812 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(52.941176%,62.352941%,85.882353%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 481.40625 L 446.546875 481.40625 L 446.546875 497.148438 L 433.214844 497.148438 Z M 433.214844 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 481.40625 L 459.878906 481.40625 L 459.878906 497.148438 L 446.546875 497.148438 Z M 446.546875 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(85.490196%,54.117647%,54.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 481.40625 L 473.214844 481.40625 L 473.214844 497.148438 L 459.882812 497.148438 Z M 459.882812 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(37.254902%,7.843137%,8.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 481.40625 L 486.546875 481.40625 L 486.546875 497.148438 L 473.214844 497.148438 Z M 473.214844 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(51.764706%,9.411765%,34.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 512.890625 L 433.214844 512.890625 L 433.214844 528.632812 L 419.882812 528.632812 Z M 419.882812 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,59.607843%,76.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 512.890625 L 446.546875 512.890625 L 446.546875 528.632812 L 433.214844 528.632812 Z M 433.214844 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 512.890625 L 459.878906 512.890625 L 459.878906 528.632812 L 446.546875 528.632812 Z M 446.546875 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(48.627451%,77.254902%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 512.890625 L 473.214844 512.890625 L 473.214844 528.632812 L 459.882812 528.632812 Z M 459.882812 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,33.72549%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 512.890625 L 486.546875 512.890625 L 486.546875 528.632812 L 473.214844 528.632812 Z M 473.214844 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(28.627451%,12.54902%,31.372549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 544.371094 L 433.214844 544.371094 L 433.214844 560.113281 L 419.882812 560.113281 Z M 419.882812 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(76.862745%,56.470588%,81.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 544.371094 L 446.546875 544.371094 L 446.546875 560.113281 L 433.214844 560.113281 Z M 433.214844 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 544.371094 L 459.878906 544.371094 L 459.878906 560.113281 L 446.546875 560.113281 Z M 446.546875 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(44.705882%,69.411765%,45.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 544.371094 L 473.214844 544.371094 L 473.214844 560.113281 L 459.882812 560.113281 Z M 459.882812 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0.784314%,22.352941%,1.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 544.371094 L 486.546875 544.371094 L 486.546875 560.113281 L 473.214844 560.113281 Z M 473.214844 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(19.215686%,16.470588%,33.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 419.882812 575.851562 L 433.214844 575.851562 L 433.214844 591.59375 L 419.882812 591.59375 Z M 419.882812 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(61.176471%,57.254902%,87.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 433.214844 575.851562 L 446.546875 575.851562 L 446.546875 591.59375 L 433.214844 591.59375 Z M 433.214844 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 446.546875 575.851562 L 459.878906 575.851562 L 459.878906 591.59375 L 446.546875 591.59375 Z M 446.546875 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(80.392157%,55.294118%,35.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 459.882812 575.851562 L 473.214844 575.851562 L 473.214844 591.59375 L 459.882812 591.59375 Z M 459.882812 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(28.627451%,16.078431%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 473.214844 575.851562 L 486.546875 575.851562 L 486.546875 591.59375 L 473.214844 591.59375 Z M 473.214844 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="520.59375" y="68.123047"/> + <use xlink:href="#glyph0-10" x="527.59375" y="68.123047"/> + <use xlink:href="#glyph0-5" x="530.59375" y="68.123047"/> + <use xlink:href="#glyph0-5" x="535.59375" y="68.123047"/> + <use xlink:href="#glyph0-21" x="540.59375" y="68.123047"/> + <use xlink:href="#glyph0-34" x="545.59375" y="68.123047"/> + <use xlink:href="#glyph0-29" x="548.59375" y="68.123047"/> + <use xlink:href="#glyph0-10" x="554.59375" y="68.123047"/> + <use xlink:href="#glyph0-18" x="557.59375" y="68.123047"/> + <use xlink:href="#glyph0-36" x="562.59375" y="68.123047"/> + <use xlink:href="#glyph0-21" x="568.59375" y="68.123047"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="520.59375" y="99.603516"/> + <use xlink:href="#glyph0-6" x="526.59375" y="99.603516"/> + <use xlink:href="#glyph0-30" x="528.59375" y="99.603516"/> + <use xlink:href="#glyph0-5" x="533.59375" y="99.603516"/> + <use xlink:href="#glyph0-34" x="538.59375" y="99.603516"/> + <use xlink:href="#glyph0-35" x="540.59375" y="99.603516"/> + <use xlink:href="#glyph0-5" x="545.59375" y="99.603516"/> + <use xlink:href="#glyph0-6" x="550.59375" y="99.603516"/> + <use xlink:href="#glyph0-6" x="552.59375" y="99.603516"/> + <use xlink:href="#glyph0-18" x="554.59375" y="99.603516"/> + <use xlink:href="#glyph0-36" x="559.59375" y="99.603516"/> + <use xlink:href="#glyph0-7" x="565.59375" y="99.603516"/> + <use xlink:href="#glyph0-12" x="567.59375" y="99.603516"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="520.59375" y="131.087891"/> + <use xlink:href="#glyph0-6" x="526.59375" y="131.087891"/> + <use xlink:href="#glyph0-30" x="528.59375" y="131.087891"/> + <use xlink:href="#glyph0-5" x="533.59375" y="131.087891"/> + <use xlink:href="#glyph0-34" x="538.59375" y="131.087891"/> + <use xlink:href="#glyph0-35" x="540.59375" y="131.087891"/> + <use xlink:href="#glyph0-5" x="545.59375" y="131.087891"/> + <use xlink:href="#glyph0-6" x="550.59375" y="131.087891"/> + <use xlink:href="#glyph0-6" x="552.59375" y="131.087891"/> + <use xlink:href="#glyph0-18" x="554.59375" y="131.087891"/> + <use xlink:href="#glyph0-36" x="559.59375" y="131.087891"/> + <use xlink:href="#glyph0-7" x="565.59375" y="131.087891"/> + <use xlink:href="#glyph0-13" x="567.59375" y="131.087891"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="520.59375" y="162.568359"/> + <use xlink:href="#glyph0-10" x="527.59375" y="162.568359"/> + <use xlink:href="#glyph0-5" x="530.59375" y="162.568359"/> + <use xlink:href="#glyph0-5" x="535.59375" y="162.568359"/> + <use xlink:href="#glyph0-21" x="540.59375" y="162.568359"/> + <use xlink:href="#glyph0-34" x="545.59375" y="162.568359"/> + <use xlink:href="#glyph0-33" x="548.59375" y="162.568359"/> + <use xlink:href="#glyph0-10" x="555.59375" y="162.568359"/> + <use xlink:href="#glyph0-2" x="558.59375" y="162.568359"/> + <use xlink:href="#glyph0-21" x="563.59375" y="162.568359"/> + <use xlink:href="#glyph0-27" x="568.59375" y="162.568359"/> + <use xlink:href="#glyph0-5" x="573.59375" y="162.568359"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-17" x="520.59375" y="194.048828"/> + <use xlink:href="#glyph0-24" x="526.59375" y="194.048828"/> + <use xlink:href="#glyph0-2" x="530.59375" y="194.048828"/> + <use xlink:href="#glyph0-21" x="535.59375" y="194.048828"/> + <use xlink:href="#glyph0-34" x="540.59375" y="194.048828"/> + <use xlink:href="#glyph0-41" x="543.59375" y="194.048828"/> + <use xlink:href="#glyph0-2" x="550.59375" y="194.048828"/> + <use xlink:href="#glyph0-27" x="555.59375" y="194.048828"/> + <use xlink:href="#glyph0-5" x="560.59375" y="194.048828"/> + <use xlink:href="#glyph0-21" x="565.59375" y="194.048828"/> + <use xlink:href="#glyph0-4" x="570.59375" y="194.048828"/> + <use xlink:href="#glyph0-2" x="572.59375" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="520.59375" y="225.529297"/> + <use xlink:href="#glyph0-10" x="524.59375" y="225.529297"/> + <use xlink:href="#glyph0-18" x="527.59375" y="225.529297"/> + <use xlink:href="#glyph0-31" x="532.59375" y="225.529297"/> + <use xlink:href="#glyph0-22" x="537.59375" y="225.529297"/> + <use xlink:href="#glyph0-23" x="539.59375" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="520.59375" y="257.013672"/> + <use xlink:href="#glyph0-10" x="526.59375" y="257.013672"/> + <use xlink:href="#glyph0-18" x="529.59375" y="257.013672"/> + <use xlink:href="#glyph0-23" x="534.59375" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-17" x="520.59375" y="288.494141"/> + <use xlink:href="#glyph0-18" x="526.59375" y="288.494141"/> + <use xlink:href="#glyph0-10" x="531.59375" y="288.494141"/> + <use xlink:href="#glyph0-11" x="534.59375" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-38" x="520.59375" y="319.974609"/> + <use xlink:href="#glyph0-22" x="526.59375" y="319.974609"/> + <use xlink:href="#glyph0-11" x="528.59375" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="520.59375" y="351.455078"/> + <use xlink:href="#glyph0-5" x="526.59375" y="351.455078"/> + <use xlink:href="#glyph0-10" x="531.59375" y="351.455078"/> + <use xlink:href="#glyph0-6" x="534.59375" y="351.455078"/> + <use xlink:href="#glyph0-22" x="536.59375" y="351.455078"/> + <use xlink:href="#glyph0-21" x="538.59375" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-26" x="520.59375" y="382.939453"/> + <use xlink:href="#glyph0-22" x="525.59375" y="382.939453"/> + <use xlink:href="#glyph0-3" x="527.59375" y="382.939453"/> + <use xlink:href="#glyph0-45" x="531.59375" y="382.939453"/> + <use xlink:href="#glyph0-18" x="536.59375" y="382.939453"/> + <use xlink:href="#glyph0-21" x="541.59375" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="520.59375" y="414.419922"/> + <use xlink:href="#glyph0-18" x="524.59375" y="414.419922"/> + <use xlink:href="#glyph0-46" x="529.59375" y="414.419922"/> + <use xlink:href="#glyph0-21" x="533.59375" y="414.419922"/> + <use xlink:href="#glyph0-18" x="538.59375" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-47" x="520.59375" y="445.900391"/> + <use xlink:href="#glyph0-10" x="526.59375" y="445.900391"/> + <use xlink:href="#glyph0-16" x="529.59375" y="445.900391"/> + <use xlink:href="#glyph0-24" x="536.59375" y="445.900391"/> + <use xlink:href="#glyph0-32" x="540.59375" y="445.900391"/> + <use xlink:href="#glyph0-18" x="546.59375" y="445.900391"/> + <use xlink:href="#glyph0-3" x="551.59375" y="445.900391"/> + <use xlink:href="#glyph0-5" x="555.59375" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-42" x="520.59375" y="477.380859"/> + <use xlink:href="#glyph0-2" x="526.59375" y="477.380859"/> + <use xlink:href="#glyph0-10" x="531.59375" y="477.380859"/> + <use xlink:href="#glyph0-4" x="534.59375" y="477.380859"/> + <use xlink:href="#glyph0-28" x="536.59375" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-48" x="520.59375" y="508.865234"/> + <use xlink:href="#glyph0-2" x="525.59375" y="508.865234"/> + <use xlink:href="#glyph0-6" x="530.59375" y="508.865234"/> + <use xlink:href="#glyph0-6" x="532.59375" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-25" x="520.59375" y="540.345703"/> + <use xlink:href="#glyph0-5" x="527.59375" y="540.345703"/> + <use xlink:href="#glyph0-24" x="531.59375" y="540.345703"/> + <use xlink:href="#glyph0-3" x="535.59375" y="540.345703"/> + <use xlink:href="#glyph0-5" x="539.59375" y="540.345703"/> + <use xlink:href="#glyph0-10" x="544.59375" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="520.59375" y="571.826172"/> + <use xlink:href="#glyph0-5" x="524.59375" y="571.826172"/> + <use xlink:href="#glyph0-2" x="529.59375" y="571.826172"/> + <use xlink:href="#glyph0-6" x="534.59375" y="571.826172"/> + <use xlink:href="#glyph0-32" x="536.59375" y="571.826172"/> + <use xlink:href="#glyph0-18" x="542.59375" y="571.826172"/> + <use xlink:href="#glyph0-3" x="547.59375" y="571.826172"/> + <use xlink:href="#glyph0-5" x="551.59375" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(0%,29.411765%,25.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 72.148438 L 533.925781 72.148438 L 533.925781 87.890625 L 520.59375 87.890625 Z M 520.59375 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(18.039216%,74.509804%,69.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 72.148438 L 547.261719 72.148438 L 547.261719 87.890625 L 533.929688 87.890625 Z M 533.929688 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 72.148438 L 560.59375 72.148438 L 560.59375 87.890625 L 547.261719 87.890625 Z M 547.261719 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(79.607843%,64.313725%,42.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 72.148438 L 573.925781 72.148438 L 573.925781 87.890625 L 560.59375 87.890625 Z M 560.59375 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(32.54902%,21.176471%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 72.148438 L 587.261719 72.148438 L 587.261719 87.890625 L 573.929688 87.890625 Z M 573.929688 72.148438 "/> +<path style="fill-rule:nonzero;fill:rgb(30.980392%,32.54902%,71.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 103.628906 L 533.925781 103.628906 L 533.925781 119.371094 L 520.59375 119.371094 Z M 520.59375 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(66.666667%,67.058824%,83.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 103.628906 L 547.261719 103.628906 L 547.261719 119.371094 L 533.929688 119.371094 Z M 533.929688 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 103.628906 L 560.59375 103.628906 L 560.59375 119.371094 L 547.261719 119.371094 Z M 547.261719 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(70.980392%,68.627451%,50.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 103.628906 L 573.925781 103.628906 L 573.925781 119.371094 L 560.59375 119.371094 Z M 560.59375 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(41.960784%,38.039216%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 103.628906 L 587.261719 103.628906 L 587.261719 119.371094 L 573.929688 119.371094 Z M 573.929688 103.628906 "/> +<path style="fill-rule:nonzero;fill:rgb(62.352941%,63.529412%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 135.109375 L 533.925781 135.109375 L 533.925781 150.851562 L 520.59375 150.851562 Z M 520.59375 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(84.313725%,85.098039%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 135.109375 L 547.261719 135.109375 L 547.261719 150.851562 L 533.929688 150.851562 Z M 533.929688 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 135.109375 L 560.59375 135.109375 L 560.59375 150.851562 L 547.261719 150.851562 Z M 547.261719 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,88.235294%,56.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 135.109375 L 573.925781 135.109375 L 573.925781 150.851562 L 560.59375 150.851562 Z M 560.59375 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(72.941176%,68.235294%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 135.109375 L 587.261719 135.109375 L 587.261719 150.851562 L 573.929688 150.851562 Z M 573.929688 135.109375 "/> +<path style="fill-rule:nonzero;fill:rgb(6.666667%,77.647059%,21.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 166.59375 L 533.925781 166.59375 L 533.925781 182.335938 L 520.59375 182.335938 Z M 520.59375 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(58.431373%,83.921569%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 166.59375 L 547.261719 166.59375 L 547.261719 182.335938 L 533.929688 182.335938 Z M 533.929688 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,88.627451%,88.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 166.59375 L 560.59375 166.59375 L 560.59375 182.335938 L 547.261719 182.335938 Z M 547.261719 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(94.117647%,73.72549%,58.431373%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 166.59375 L 573.925781 166.59375 L 573.925781 182.335938 L 560.59375 182.335938 Z M 560.59375 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,59.215686%,3.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 166.59375 L 587.261719 166.59375 L 587.261719 182.335938 L 573.929688 182.335938 Z M 573.929688 166.59375 "/> +<path style="fill-rule:nonzero;fill:rgb(5.882353%,81.176471%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 198.074219 L 533.925781 198.074219 L 533.925781 213.816406 L 520.59375 213.816406 Z M 520.59375 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(73.72549%,89.803922%,87.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 198.074219 L 547.261719 198.074219 L 547.261719 213.816406 L 533.929688 213.816406 Z M 533.929688 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 198.074219 L 560.59375 198.074219 L 560.59375 213.816406 L 547.261719 213.816406 Z M 547.261719 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,82.745098%,90.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 198.074219 L 573.925781 198.074219 L 573.925781 213.816406 L 560.59375 213.816406 Z M 560.59375 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(96.862745%,61.176471%,83.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 198.074219 L 587.261719 198.074219 L 587.261719 213.816406 L 573.929688 213.816406 Z M 573.929688 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,60.784314%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 229.554688 L 533.925781 229.554688 L 533.925781 245.296875 L 520.59375 245.296875 Z M 520.59375 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,77.254902%,78.039216%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 229.554688 L 547.261719 229.554688 L 547.261719 245.296875 L 533.929688 245.296875 Z M 533.929688 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 229.554688 L 560.59375 229.554688 L 560.59375 245.296875 L 547.261719 245.296875 Z M 547.261719 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(87.058824%,66.27451%,80%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 229.554688 L 573.925781 229.554688 L 573.925781 245.296875 L 560.59375 245.296875 Z M 560.59375 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,36.470588%,66.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 229.554688 L 587.261719 229.554688 L 587.261719 245.296875 L 573.929688 245.296875 Z M 573.929688 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,16.862745%,29.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 261.035156 L 533.925781 261.035156 L 533.925781 276.777344 L 520.59375 276.777344 Z M 520.59375 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(39.215686%,51.372549%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 261.035156 L 547.261719 261.035156 L 547.261719 276.777344 L 533.929688 276.777344 Z M 533.929688 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 261.035156 L 560.59375 261.035156 L 560.59375 276.777344 L 547.261719 276.777344 Z M 547.261719 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(51.372549%,50.980392%,32.941176%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 261.035156 L 573.925781 261.035156 L 573.925781 276.777344 L 560.59375 276.777344 Z M 560.59375 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(16.078431%,15.686275%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 261.035156 L 587.261719 261.035156 L 587.261719 276.777344 L 573.929688 276.777344 Z M 573.929688 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,16.078431%,30.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 292.519531 L 533.925781 292.519531 L 533.925781 308.261719 L 520.59375 308.261719 Z M 520.59375 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(41.568627%,55.294118%,71.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 292.519531 L 547.261719 292.519531 L 547.261719 308.261719 L 533.929688 308.261719 Z M 533.929688 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 292.519531 L 560.59375 292.519531 L 560.59375 308.261719 L 547.261719 308.261719 Z M 547.261719 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(39.607843%,59.215686%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 292.519531 L 573.925781 292.519531 L 573.925781 308.261719 L 560.59375 308.261719 Z M 560.59375 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,18.431373%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 292.519531 L 587.261719 292.519531 L 587.261719 308.261719 L 573.929688 308.261719 Z M 573.929688 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,18.039216%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 324 L 533.925781 324 L 533.925781 339.742188 L 520.59375 339.742188 Z M 520.59375 324 "/> +<path style="fill-rule:nonzero;fill:rgb(35.294118%,56.470588%,73.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 324 L 547.261719 324 L 547.261719 339.742188 L 533.929688 339.742188 Z M 533.929688 324 "/> +<path style="fill-rule:nonzero;fill:rgb(94.509804%,94.509804%,94.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 324 L 560.59375 324 L 560.59375 339.742188 L 547.261719 339.742188 Z M 547.261719 324 "/> +<path style="fill-rule:nonzero;fill:rgb(66.27451%,52.156863%,30.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 324 L 573.925781 324 L 573.925781 339.742188 L 560.59375 339.742188 Z M 560.59375 324 "/> +<path style="fill-rule:nonzero;fill:rgb(24.313725%,12.54902%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 324 L 587.261719 324 L 587.261719 339.742188 L 573.929688 339.742188 Z M 573.929688 324 "/> +<path style="fill-rule:nonzero;fill:rgb(49.803922%,74.901961%,96.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 355.480469 L 533.925781 355.480469 L 533.925781 371.222656 L 520.59375 371.222656 Z M 520.59375 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,29.411765%,45.098039%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 355.480469 L 547.261719 355.480469 L 547.261719 371.222656 L 533.929688 371.222656 Z M 533.929688 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(6.666667%,6.666667%,6.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 355.480469 L 560.59375 355.480469 L 560.59375 371.222656 L 547.261719 371.222656 Z M 547.261719 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(44.313725%,20.392157%,18.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 355.480469 L 573.925781 355.480469 L 573.925781 371.222656 L 560.59375 371.222656 Z M 560.59375 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,63.529412%,61.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 355.480469 L 587.261719 355.480469 L 587.261719 371.222656 L 573.929688 371.222656 Z M 573.929688 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,98.823529%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 386.964844 L 533.925781 386.964844 L 533.925781 402.707031 L 520.59375 402.707031 Z M 520.59375 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(39.607843%,50.980392%,61.568627%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 386.964844 L 547.261719 386.964844 L 547.261719 402.707031 L 533.929688 402.707031 Z M 533.929688 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(9.411765%,9.411765%,9.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 386.964844 L 560.59375 386.964844 L 560.59375 402.707031 L 547.261719 402.707031 Z M 547.261719 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(50.980392%,50.588235%,33.72549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 386.964844 L 573.925781 386.964844 L 573.925781 402.707031 L 560.59375 402.707031 Z M 560.59375 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(98.823529%,98.823529%,82.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 386.964844 L 587.261719 386.964844 L 587.261719 402.707031 L 573.929688 402.707031 Z M 573.929688 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,87.843137%,100%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 418.445312 L 533.925781 418.445312 L 533.925781 434.1875 L 520.59375 434.1875 Z M 520.59375 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(40%,43.137255%,60.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 418.445312 L 547.261719 418.445312 L 547.261719 434.1875 L 533.929688 434.1875 Z M 533.929688 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(6.666667%,6.666667%,6.666667%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 418.445312 L 560.59375 418.445312 L 560.59375 434.1875 L 547.261719 434.1875 Z M 547.261719 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(33.333333%,47.843137%,27.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 418.445312 L 573.925781 418.445312 L 573.925781 434.1875 L 560.59375 434.1875 Z M 560.59375 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(76.078431%,93.72549%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 418.445312 L 587.261719 418.445312 L 587.261719 434.1875 L 573.929688 434.1875 Z M 573.929688 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,41.176471%,50.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 449.925781 L 533.925781 449.925781 L 533.925781 465.667969 L 520.59375 465.667969 Z M 520.59375 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(89.803922%,66.27451%,70.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 449.925781 L 547.261719 449.925781 L 547.261719 465.667969 L 533.929688 465.667969 Z M 533.929688 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(97.254902%,98.823529%,89.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 449.925781 L 560.59375 449.925781 L 560.59375 465.667969 L 547.261719 465.667969 Z M 547.261719 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(70.980392%,74.509804%,49.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 449.925781 L 573.925781 449.925781 L 573.925781 465.667969 L 560.59375 465.667969 Z M 560.59375 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(47.45098%,50.980392%,20%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 449.925781 L 587.261719 449.925781 L 587.261719 465.667969 L 573.929688 465.667969 Z M 573.929688 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(63.921569%,41.960784%,16.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 481.40625 L 533.925781 481.40625 L 533.925781 497.148438 L 520.59375 497.148438 Z M 520.59375 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(77.647059%,66.666667%,45.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 481.40625 L 547.261719 481.40625 L 547.261719 497.148438 L 533.929688 497.148438 Z M 533.929688 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(92.941176%,91.764706%,76.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 481.40625 L 560.59375 481.40625 L 560.59375 497.148438 L 547.261719 497.148438 Z M 547.261719 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(58.039216%,72.54902%,65.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 481.40625 L 573.925781 481.40625 L 573.925781 497.148438 L 560.59375 497.148438 Z M 560.59375 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(14.901961%,52.54902%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 481.40625 L 587.261719 481.40625 L 587.261719 497.148438 L 573.929688 497.148438 Z M 573.929688 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(23.529412%,34.901961%,25.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 512.890625 L 533.925781 512.890625 L 533.925781 528.632812 L 520.59375 528.632812 Z M 520.59375 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(58.039216%,63.921569%,49.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 512.890625 L 547.261719 512.890625 L 547.261719 528.632812 L 533.929688 528.632812 Z M 533.929688 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(98.431373%,94.901961%,76.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 512.890625 L 560.59375 512.890625 L 560.59375 528.632812 L 547.261719 528.632812 Z M 547.261719 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(85.882353%,65.882353%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 512.890625 L 573.925781 512.890625 L 573.925781 528.632812 L 560.59375 528.632812 Z M 560.59375 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,32.156863%,16.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 512.890625 L 587.261719 512.890625 L 587.261719 528.632812 L 573.929688 528.632812 Z M 573.929688 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,52.156863%,52.156863%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 544.371094 L 533.925781 544.371094 L 533.925781 560.113281 L 520.59375 560.113281 Z M 520.59375 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(60.784314%,72.941176%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 544.371094 L 547.261719 544.371094 L 547.261719 560.113281 L 533.929688 560.113281 Z M 533.929688 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(98.431373%,94.901961%,76.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 544.371094 L 560.59375 544.371094 L 560.59375 560.113281 L 547.261719 560.113281 Z M 547.261719 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(87.058824%,65.882353%,40.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 544.371094 L 573.925781 544.371094 L 573.925781 560.113281 L 560.59375 560.113281 Z M 560.59375 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(78.039216%,32.156863%,16.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 544.371094 L 587.261719 544.371094 L 587.261719 560.113281 L 573.929688 560.113281 Z M 573.929688 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,58.431373%,57.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 520.59375 575.851562 L 533.925781 575.851562 L 533.925781 591.59375 L 520.59375 591.59375 Z M 520.59375 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(62.352941%,73.72549%,64.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 533.929688 575.851562 L 547.261719 575.851562 L 547.261719 591.59375 L 533.929688 591.59375 Z M 533.929688 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(93.72549%,91.372549%,78.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 547.261719 575.851562 L 560.59375 575.851562 L 560.59375 591.59375 L 547.261719 591.59375 Z M 547.261719 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(85.098039%,67.058824%,56.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 560.59375 575.851562 L 573.925781 575.851562 L 573.925781 591.59375 L 560.59375 591.59375 Z M 560.59375 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(82.745098%,36.078431%,47.45098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 573.929688 575.851562 L 587.261719 575.851562 L 587.261719 591.59375 L 573.929688 591.59375 Z M 573.929688 575.851562 "/> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-37" x="621.308594" y="194.048828"/> + <use xlink:href="#glyph0-5" x="625.308594" y="194.048828"/> + <use xlink:href="#glyph0-16" x="630.308594" y="194.048828"/> + <use xlink:href="#glyph0-31" x="637.308594" y="194.048828"/> + <use xlink:href="#glyph0-3" x="642.308594" y="194.048828"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="621.308594" y="225.529297"/> + <use xlink:href="#glyph0-30" x="627.308594" y="225.529297"/> + <use xlink:href="#glyph0-33" x="632.308594" y="225.529297"/> + <use xlink:href="#glyph0-10" x="639.308594" y="225.529297"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="257.013672"/> + <use xlink:href="#glyph0-19" x="627.308594" y="257.013672"/> + <use xlink:href="#glyph0-29" x="632.308594" y="257.013672"/> + <use xlink:href="#glyph0-30" x="638.308594" y="257.013672"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="288.494141"/> + <use xlink:href="#glyph0-19" x="627.308594" y="288.494141"/> + <use xlink:href="#glyph0-25" x="632.308594" y="288.494141"/> + <use xlink:href="#glyph0-24" x="638.308594" y="288.494141"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="621.308594" y="319.974609"/> + <use xlink:href="#glyph0-22" x="626.308594" y="319.974609"/> + <use xlink:href="#glyph0-35" x="628.308594" y="319.974609"/> + <use xlink:href="#glyph0-25" x="633.308594" y="319.974609"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-1" x="621.308594" y="351.455078"/> + <use xlink:href="#glyph0-32" x="626.308594" y="351.455078"/> + <use xlink:href="#glyph0-25" x="632.308594" y="351.455078"/> + <use xlink:href="#glyph0-21" x="639.308594" y="351.455078"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-29" x="621.308594" y="382.939453"/> + <use xlink:href="#glyph0-10" x="627.308594" y="382.939453"/> + <use xlink:href="#glyph0-29" x="630.308594" y="382.939453"/> + <use xlink:href="#glyph0-25" x="636.308594" y="382.939453"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="414.419922"/> + <use xlink:href="#glyph0-19" x="627.308594" y="414.419922"/> + <use xlink:href="#glyph0-35" x="632.308594" y="414.419922"/> + <use xlink:href="#glyph0-6" x="638.308594" y="414.419922"/> + <use xlink:href="#glyph0-29" x="640.308594" y="414.419922"/> + <use xlink:href="#glyph0-30" x="646.308594" y="414.419922"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="445.900391"/> + <use xlink:href="#glyph0-19" x="627.308594" y="445.900391"/> + <use xlink:href="#glyph0-35" x="632.308594" y="445.900391"/> + <use xlink:href="#glyph0-6" x="638.308594" y="445.900391"/> + <use xlink:href="#glyph0-25" x="640.308594" y="445.900391"/> + <use xlink:href="#glyph0-21" x="647.308594" y="445.900391"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-14" x="621.308594" y="477.380859"/> + <use xlink:href="#glyph0-31" x="627.308594" y="477.380859"/> + <use xlink:href="#glyph0-5" x="632.308594" y="477.380859"/> + <use xlink:href="#glyph0-23" x="637.308594" y="477.380859"/> + <use xlink:href="#glyph0-4" x="641.308594" y="477.380859"/> + <use xlink:href="#glyph0-10" x="643.308594" y="477.380859"/> + <use xlink:href="#glyph0-2" x="646.308594" y="477.380859"/> + <use xlink:href="#glyph0-6" x="651.308594" y="477.380859"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-49" x="621.308594" y="508.865234"/> + <use xlink:href="#glyph0-22" x="626.308594" y="508.865234"/> + <use xlink:href="#glyph0-3" x="628.308594" y="508.865234"/> + <use xlink:href="#glyph0-3" x="632.308594" y="508.865234"/> + <use xlink:href="#glyph0-18" x="636.308594" y="508.865234"/> + <use xlink:href="#glyph0-30" x="641.308594" y="508.865234"/> + <use xlink:href="#glyph0-7" x="646.308594" y="508.865234"/> + <use xlink:href="#glyph0-8" x="648.308594" y="508.865234"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-17" x="621.308594" y="540.345703"/> + <use xlink:href="#glyph0-22" x="627.308594" y="540.345703"/> + <use xlink:href="#glyph0-50" x="629.308594" y="540.345703"/> + <use xlink:href="#glyph0-22" x="633.308594" y="540.345703"/> + <use xlink:href="#glyph0-19" x="635.308594" y="540.345703"/> + <use xlink:href="#glyph0-22" x="640.308594" y="540.345703"/> + <use xlink:href="#glyph0-3" x="642.308594" y="540.345703"/> +</g> +<g style="fill:rgb(0%,0%,0%);fill-opacity:1;"> + <use xlink:href="#glyph0-32" x="621.308594" y="571.826172"/> + <use xlink:href="#glyph0-18" x="627.308594" y="571.826172"/> + <use xlink:href="#glyph0-16" x="632.308594" y="571.826172"/> + <use xlink:href="#glyph0-2" x="639.308594" y="571.826172"/> +</g> +<path style="fill-rule:nonzero;fill:rgb(3.137255%,57.647059%,57.254902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 198.074219 L 634.640625 198.074219 L 634.640625 213.816406 L 621.308594 213.816406 Z M 621.308594 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(42.352941%,76.470588%,50.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 198.074219 L 647.976562 198.074219 L 647.976562 213.816406 L 634.644531 213.816406 Z M 634.644531 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,88.627451%,61.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 198.074219 L 661.308594 198.074219 L 661.308594 213.816406 L 647.976562 213.816406 Z M 647.976562 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(91.372549%,62.352941%,41.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 198.074219 L 674.640625 198.074219 L 674.640625 213.816406 L 661.308594 213.816406 Z M 661.308594 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(81.176471%,34.901961%,49.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 198.074219 L 687.976562 198.074219 L 687.976562 213.816406 L 674.644531 213.816406 Z M 674.644531 198.074219 "/> +<path style="fill-rule:nonzero;fill:rgb(45.490196%,21.568627%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 229.554688 L 634.640625 229.554688 L 634.640625 245.296875 L 621.308594 245.296875 Z M 621.308594 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(94.901961%,61.960784%,31.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 229.554688 L 647.976562 229.554688 L 647.976562 245.296875 L 634.644531 245.296875 Z M 634.644531 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 229.554688 L 661.308594 229.554688 L 661.308594 245.296875 L 647.976562 245.296875 Z M 647.976562 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(59.215686%,57.254902%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 229.554688 L 674.640625 229.554688 L 674.640625 245.296875 L 661.308594 245.296875 Z M 661.308594 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(10.980392%,5.098039%,31.764706%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 229.554688 L 687.976562 229.554688 L 687.976562 245.296875 L 674.644531 245.296875 Z M 674.644531 229.554688 "/> +<path style="fill-rule:nonzero;fill:rgb(38.039216%,7.45098%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 261.035156 L 634.640625 261.035156 L 634.640625 276.777344 L 621.308594 276.777344 Z M 621.308594 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(87.45098%,50.980392%,44.313725%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 261.035156 L 647.976562 261.035156 L 647.976562 276.777344 L 634.644531 276.777344 Z M 634.644531 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 261.035156 L 661.308594 261.035156 L 661.308594 276.777344 L 647.976562 276.777344 Z M 647.976562 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(43.529412%,68.627451%,81.960784%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 261.035156 L 674.640625 261.035156 L 674.640625 276.777344 L 661.308594 276.777344 Z M 661.308594 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,20.784314%,37.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 261.035156 L 687.976562 261.035156 L 687.976562 276.777344 L 674.644531 276.777344 Z M 674.644531 261.035156 "/> +<path style="fill-rule:nonzero;fill:rgb(40.784314%,0%,11.372549%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 292.519531 L 634.640625 292.519531 L 634.640625 308.261719 L 621.308594 308.261719 Z M 621.308594 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(88.627451%,50.980392%,34.901961%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 292.519531 L 647.976562 292.519531 L 647.976562 308.261719 L 634.644531 308.261719 Z M 634.644531 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 292.519531 L 661.308594 292.519531 L 661.308594 308.261719 L 647.976562 308.261719 Z M 647.976562 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(60.784314%,60.784314%,60.784314%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 292.519531 L 674.640625 292.519531 L 674.640625 308.261719 L 661.308594 308.261719 Z M 661.308594 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(18.823529%,18.823529%,18.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 292.519531 L 687.976562 292.519531 L 687.976562 308.261719 L 674.644531 308.261719 Z M 674.644531 292.519531 "/> +<path style="fill-rule:nonzero;fill:rgb(56.470588%,0%,36.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 324 L 634.640625 324 L 634.640625 339.742188 L 621.308594 339.742188 Z M 621.308594 324 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,60%,75.294118%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 324 L 647.976562 324 L 647.976562 339.742188 L 634.644531 339.742188 Z M 634.644531 324 "/> +<path style="fill-rule:nonzero;fill:rgb(97.647059%,97.647059%,97.647059%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 324 L 661.308594 324 L 661.308594 339.742188 L 647.976562 339.742188 Z M 647.976562 324 "/> +<path style="fill-rule:nonzero;fill:rgb(58.039216%,78.823529%,43.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 324 L 674.640625 324 L 674.640625 339.742188 L 661.308594 339.742188 Z M 661.308594 324 "/> +<path style="fill-rule:nonzero;fill:rgb(19.215686%,36.470588%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 324 L 687.976562 324 L 687.976562 339.742188 L 674.644531 339.742188 Z M 674.644531 324 "/> +<path style="fill-rule:nonzero;fill:rgb(25.490196%,5.490196%,28.235294%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 355.480469 L 634.640625 355.480469 L 634.640625 371.222656 L 621.308594 371.222656 Z M 621.308594 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(69.019608%,52.156863%,72.54902%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 355.480469 L 647.976562 355.480469 L 647.976562 371.222656 L 634.644531 371.222656 Z M 634.644531 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 355.480469 L 661.308594 355.480469 L 661.308594 371.222656 L 647.976562 371.222656 Z M 647.976562 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(48.627451%,74.901961%,48.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 355.480469 L 674.640625 355.480469 L 674.640625 371.222656 L 661.308594 371.222656 Z M 661.308594 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(9.019608%,26.666667%,9.019608%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 355.480469 L 687.976562 355.480469 L 687.976562 371.222656 L 674.644531 371.222656 Z M 674.644531 355.480469 "/> +<path style="fill-rule:nonzero;fill:rgb(32.54902%,21.176471%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 386.964844 L 634.640625 386.964844 L 634.640625 402.707031 L 621.308594 402.707031 Z M 621.308594 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(81.960784%,63.921569%,34.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 386.964844 L 647.976562 386.964844 L 647.976562 402.707031 L 634.644531 402.707031 Z M 634.644531 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(96.470588%,96.470588%,96.470588%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 386.964844 L 661.308594 386.964844 L 661.308594 402.707031 L 647.976562 402.707031 Z M 647.976562 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(40.392157%,69.803922%,66.27451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 386.964844 L 674.640625 386.964844 L 674.640625 402.707031 L 661.308594 402.707031 Z M 661.308594 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,23.921569%,20.392157%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 386.964844 L 687.976562 386.964844 L 687.976562 402.707031 L 674.644531 402.707031 Z M 674.644531 386.964844 "/> +<path style="fill-rule:nonzero;fill:rgb(64.705882%,6.666667%,13.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 418.445312 L 634.640625 418.445312 L 634.640625 434.1875 L 621.308594 434.1875 Z M 621.308594 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(92.156863%,61.176471%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 418.445312 L 647.976562 418.445312 L 647.976562 434.1875 L 634.644531 434.1875 Z M 634.644531 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.215686%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 418.445312 L 661.308594 418.445312 L 661.308594 434.1875 L 647.976562 434.1875 Z M 647.976562 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(41.176471%,73.333333%,67.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 418.445312 L 674.640625 418.445312 L 674.640625 434.1875 L 661.308594 434.1875 Z M 661.308594 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(19.607843%,30.196078%,62.745098%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 418.445312 L 687.976562 418.445312 L 687.976562 434.1875 L 674.644531 434.1875 Z M 674.644531 418.445312 "/> +<path style="fill-rule:nonzero;fill:rgb(64.705882%,6.666667%,13.333333%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 449.925781 L 634.640625 449.925781 L 634.640625 465.667969 L 621.308594 465.667969 Z M 621.308594 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(92.156863%,61.176471%,0%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 449.925781 L 647.976562 449.925781 L 647.976562 465.667969 L 634.644531 465.667969 Z M 634.644531 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.215686%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 449.925781 L 661.308594 449.925781 L 661.308594 465.667969 L 647.976562 465.667969 Z M 647.976562 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(52.156863%,73.72549%,27.843137%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 449.925781 L 674.640625 449.925781 L 674.640625 465.667969 L 661.308594 465.667969 Z M 661.308594 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,38.431373%,15.686275%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 449.925781 L 687.976562 449.925781 L 687.976562 465.667969 L 674.644531 465.667969 Z M 674.644531 449.925781 "/> +<path style="fill-rule:nonzero;fill:rgb(65.490196%,10.588235%,29.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 481.40625 L 634.640625 481.40625 L 634.640625 497.148438 L 621.308594 497.148438 Z M 621.308594 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(95.294118%,60.784314%,16.078431%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 481.40625 L 647.976562 481.40625 L 647.976562 497.148438 L 634.644531 497.148438 Z M 634.644531 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(99.607843%,99.215686%,74.509804%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 481.40625 L 661.308594 481.40625 L 661.308594 497.148438 L 647.976562 497.148438 Z M 647.976562 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(13.333333%,76.862745%,70.196078%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 481.40625 L 674.640625 481.40625 L 674.640625 497.148438 L 661.308594 497.148438 Z M 661.308594 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(34.509804%,29.411765%,62.352941%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 481.40625 L 687.976562 481.40625 L 687.976562 497.148438 L 674.644531 497.148438 Z M 674.644531 481.40625 "/> +<path style="fill-rule:nonzero;fill:rgb(23.137255%,60%,69.411765%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 512.890625 L 634.640625 512.890625 L 634.640625 528.632812 L 621.308594 528.632812 Z M 621.308594 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(48.627451%,72.941176%,58.823529%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 512.890625 L 647.976562 512.890625 L 647.976562 528.632812 L 634.644531 528.632812 Z M 634.644531 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(91.764706%,79.607843%,16.862745%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 512.890625 L 661.308594 512.890625 L 661.308594 528.632812 L 647.976562 528.632812 Z M 647.976562 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(90.588235%,56.078431%,3.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 512.890625 L 674.640625 512.890625 L 674.640625 528.632812 L 661.308594 528.632812 Z M 661.308594 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(96.078431%,9.803922%,10.980392%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 512.890625 L 687.976562 512.890625 L 687.976562 528.632812 L 674.644531 528.632812 Z M 674.644531 512.890625 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,12.941176%,30.588235%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 544.371094 L 634.640625 544.371094 L 634.640625 560.113281 L 621.308594 560.113281 Z M 621.308594 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(24.313725%,29.803922%,43.137255%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 544.371094 L 647.976562 544.371094 L 647.976562 560.113281 L 634.644531 560.113281 Z M 634.644531 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(48.627451%,48.627451%,48.627451%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 544.371094 L 661.308594 544.371094 L 661.308594 560.113281 L 647.976562 560.113281 Z M 647.976562 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(74.901961%,69.411765%,43.921569%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 544.371094 L 674.640625 544.371094 L 674.640625 560.113281 L 661.308594 560.113281 Z M 661.308594 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(100%,91.372549%,24.705882%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 544.371094 L 687.976562 544.371094 L 687.976562 560.113281 L 674.644531 560.113281 Z M 674.644531 544.371094 "/> +<path style="fill-rule:nonzero;fill:rgb(49.019608%,0.392157%,7.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 621.308594 575.851562 L 634.640625 575.851562 L 634.640625 591.59375 L 621.308594 591.59375 Z M 621.308594 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(77.254902%,63.921569%,25.490196%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 634.644531 575.851562 L 647.976562 575.851562 L 647.976562 591.59375 L 634.644531 591.59375 Z M 634.644531 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(83.921569%,93.72549%,81.176471%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 647.976562 575.851562 L 661.308594 575.851562 L 661.308594 591.59375 L 647.976562 591.59375 Z M 647.976562 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(0%,66.666667%,67.058824%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 661.308594 575.851562 L 674.640625 575.851562 L 674.640625 591.59375 L 661.308594 591.59375 Z M 661.308594 575.851562 "/> +<path style="fill-rule:nonzero;fill:rgb(12.156863%,15.686275%,63.529412%);fill-opacity:1;stroke-width:0.75;stroke-linecap:round;stroke-linejoin:round;stroke:rgb(0%,0%,0%);stroke-opacity:1;stroke-miterlimit:10;" d="M 674.644531 575.851562 L 687.976562 575.851562 L 687.976562 591.59375 L 674.644531 591.59375 Z M 674.644531 575.851562 "/> +</g> +</svg> \ No newline at end of file diff --git a/public/references.html b/public/references.html index 9c6dd05f3da1bd51d9f222b885b2853eee0aa79a..107451aa80378f2c43e2f670200077e6124d309e 100644 --- a/public/references.html +++ b/public/references.html @@ -44,7 +44,7 @@ div.csl-indent { <script src="site_libs/quarto-search/fuse.min.js"></script> <script src="site_libs/quarto-search/quarto-search.js"></script> <meta name="quarto:offset" content="./"> -<link href="./01-introduction.html" rel="prev"> +<link href="./05-mapping_with_r.html" rel="prev"> <script src="site_libs/quarto-html/quarto.js"></script> <script src="site_libs/quarto-html/popper.min.js"></script> <script src="site_libs/quarto-html/tippy.umd.min.js"></script> @@ -119,6 +119,21 @@ div.csl-indent { <div class="sidebar-item-container"> <a href="./01-introduction.html" class="sidebar-item-text sidebar-link"><span class="chapter-number">1</span> <span class="chapter-title">Introduction</span></a> </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./02-data_acquisition.html" class="sidebar-item-text sidebar-link"><span class="chapter-number">2</span> <span class="chapter-title">Data Acquisition</span></a> + </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./03-vector_data.html" class="sidebar-item-text sidebar-link"><span class="chapter-number">3</span> <span class="chapter-title">Vector Data</span></a> + </div> +</li> + <li class="sidebar-item"> + <div class="sidebar-item-container"> + <a href="./05-mapping_with_r.html" class="sidebar-item-text sidebar-link"><span class="chapter-number">4</span> <span class="chapter-title">Mapping With R</span></a> + </div> </li> <li class="sidebar-item"> <div class="sidebar-item-container"> @@ -152,6 +167,18 @@ div.csl-indent { </header> <div id="refs" class="references csl-bib-body hanging-indent" role="doc-bibliography"> +<div id="ref-JS-Leaflet" class="csl-entry" role="doc-biblioentry"> +Agafonkin, Vladimir. 2015. <span>“Leaflet Javascript Libary.â€</span> +</div> +<div id="ref-mapview" class="csl-entry" role="doc-biblioentry"> +Appelhans, Tim, Florian Detsch, Christoph Reudenbach, and Stefan +Woellauer. 2022. <span>“Mapview: Interactive Viewing of Spatial Data in +r.â€</span> <a href="https://CRAN.R-project.org/package=mapview">https://CRAN.R-project.org/package=mapview</a>. +</div> +<div id="ref-mapedit" class="csl-entry" role="doc-biblioentry"> +Appelhans, Tim, Kenton Russell, and Lorenzo Busetto. 2020. +<span>“Mapedit: Interactive Editing of Spatial Data in r.â€</span> <a href="https://CRAN.R-project.org/package=mapedit">https://CRAN.R-project.org/package=mapedit</a>. +</div> <div id="ref-rgdal" class="csl-entry" role="doc-biblioentry"> Bivand, Roger, Tim Keitt, and Barry Rowlingson. 2022. <span>“Rgdal: Bindings for the ’Geospatial’ Data Abstraction Library.â€</span> <a href="https://CRAN.R-project.org/package=rgdal">https://CRAN.R-project.org/package=rgdal</a>. @@ -160,6 +187,36 @@ Bindings for the ’Geospatial’ Data Abstraction Library.â€</span> <a href="h Bivand, Roger, and Colin Rundel. 2021. <span>“Rgeos: Interface to Geometry Engine - Open Source (’GEOS’).â€</span> <a href="https://CRAN.R-project.org/package=rgeos">https://CRAN.R-project.org/package=rgeos</a>. </div> +<div id="ref-Brunet93" class="csl-entry" role="doc-biblioentry"> +Brunet, Roger, Robert Ferras, and Hervé Théry. 1993. <em>Les Mots de La +g<span>é</span>ographie: Dictionnaire Critique</em>. 03) 911 BRU. +</div> +<div id="ref-tidygeocoder" class="csl-entry" role="doc-biblioentry"> +Cambon, Jesse, Diego Hernangómez, Christopher Belanger, and Daniel +Possenriede. 2021. <span>“Tidygeocoder: An r Package for +Geocodingâ€</span> 6: 3544. <a href="https://doi.org/10.21105/joss.03544">https://doi.org/10.21105/joss.03544</a>. +</div> +<div id="ref-Cauvin13" class="csl-entry" role="doc-biblioentry"> +Cauvin, Colette, Francisco Escobar, and Aziz Serradj. 2013. <em>Thematic +Cartography, Cartography and the Impact of the Quantitative +Revolution</em>. Vol. 2. John Wiley & Sons. +</div> +<div id="ref-leaflet" class="csl-entry" role="doc-biblioentry"> +Cheng, Joe, Bhaskar Karambelkar, and Yihui Xie. 2022. <span>“Leaflet: +Create Interactive Web Maps with the JavaScript ’Leaflet’ +Library.â€</span> <a href="https://CRAN.R-project.org/package=leaflet">https://CRAN.R-project.org/package=leaflet</a>. +</div> +<div id="ref-Dorling96" class="csl-entry" role="doc-biblioentry"> +Dorling, Daniel. 1996. <em>Area Cartograms: Their Use and Creation, +Concepts and Techniques in Modern Geography</em>. Vol. 59. CATMOG: +Concepts and Techniques in Modern Geography. Institute of British +Geographers. +</div> +<div id="ref-Dougenik85" class="csl-entry" role="doc-biblioentry"> +Dougenik, James A, Nicholas R Chrisman, and Duane R Niemeyer. 1985. +<span>“An Algorithm to Construct Continuous Area Cartograms.â€</span> +<em>The Professional Geographer</em> 37 (1): 75–81. +</div> <div id="ref-ggspatial" class="csl-entry" role="doc-biblioentry"> Dunnington, Dewey. 2021. <span>“Ggspatial: Spatial Data Framework for Ggplot2.â€</span> <a href="https://CRAN.R-project.org/package=ggspatial">https://CRAN.R-project.org/package=ggspatial</a>. @@ -168,13 +225,31 @@ Ggplot2.â€</span> <a href="https://CRAN.R-project.org/package=ggspatial">https: GDAL/OGR contributors. n.d. <em><span>GDAL/OGR</span> Geospatial Data Abstraction Software Library</em>. Open Source Geospatial Foundation. <a href="https://gdal.org">https://gdal.org</a>. </div> +<div id="ref-osmextract" class="csl-entry" role="doc-biblioentry"> +Gilardi, Andrea, and Robin Lovelace. 2021. <span>“Osmextract: Download +and Import Open Street Map Data Extracts.â€</span> <a href="https://CRAN.R-project.org/package=osmextract">https://CRAN.R-project.org/package=osmextract</a>. +</div> +<div id="ref-linemap" class="csl-entry" role="doc-biblioentry"> +Giraud, Timothée. 2021a. <span>“Linemap: Line Maps.â€</span> <a href="https://CRAN.R-project.org/package=linemap">https://CRAN.R-project.org/package=linemap</a>. +</div> +<div id="ref-maptiles" class="csl-entry" role="doc-biblioentry"> +———. 2021b. <span>“Maptiles: Download and Display Map Tiles.â€</span> <a href="https://CRAN.R-project.org/package=maptiles">https://CRAN.R-project.org/package=maptiles</a>. +</div> <div id="ref-mapsf" class="csl-entry" role="doc-biblioentry"> -Giraud, Timothée. 2022. <span>“Mapsf: Thematic Cartography.â€</span> <a href="https://CRAN.R-project.org/package=mapsf">https://CRAN.R-project.org/package=mapsf</a>. +———. 2022a. <span>“Mapsf: Thematic Cartography.â€</span> <a href="https://CRAN.R-project.org/package=mapsf">https://CRAN.R-project.org/package=mapsf</a>. +</div> +<div id="ref-tanaka" class="csl-entry" role="doc-biblioentry"> +———. 2022b. <span>“Tanaka: Design Shaded Contour Lines (or Tanaka) +Maps.â€</span> <a href="https://CRAN.R-project.org/package=tanaka">https://CRAN.R-project.org/package=tanaka</a>. </div> <div id="ref-cartography" class="csl-entry" role="doc-biblioentry"> Giraud, Timothée, and Nicolas Lambert. 2016. <span>“Cartography: Create and Integrate Maps in Your r Workflowâ€</span> 1. <a href="https://doi.org/10.21105/joss.00054">https://doi.org/10.21105/joss.00054</a>. </div> +<div id="ref-banR" class="csl-entry" role="doc-biblioentry"> +Gombin, Joel, and Paul-Antoine Chevalier. 2022. <span>“banR: R Client +for the BAN API.â€</span> +</div> <div id="ref-raster" class="csl-entry" role="doc-biblioentry"> Hijmans, Robert J. 2022a. <span>“Raster: Geographic Data Analysis and Modeling.â€</span> <a href="https://CRAN.R-project.org/package=raster">https://CRAN.R-project.org/package=raster</a>. @@ -182,6 +257,27 @@ Modeling.â€</span> <a href="https://CRAN.R-project.org/package=raster">https:// <div id="ref-terra" class="csl-entry" role="doc-biblioentry"> ———. 2022b. <span>“Terra: Spatial Data Analysis.â€</span> <a href="https://CRAN.R-project.org/package=terra">https://CRAN.R-project.org/package=terra</a>. </div> +<div id="ref-cartogram" class="csl-entry" role="doc-biblioentry"> +Jeworutzki, Sebastian. 2020. <span>“Cartogram: Create Cartograms with +r.â€</span> <a href="https://CRAN.R-project.org/package=cartogram">https://CRAN.R-project.org/package=cartogram</a>. +</div> +<div id="ref-Lambert15" class="csl-entry" role="doc-biblioentry"> +Lambert, Nicolas. 2015. <span>“Les Anamorphoses Cartographiques.â€</span> +Blog. <em>Carnet Néocartographique</em>. <a href="https://neocarto.hypotheses.org/366" class="uri">https://neocarto.hypotheses.org/366</a>. +</div> +<div id="ref-Olson76" class="csl-entry" role="doc-biblioentry"> +Olson, Judy M. 1976. <span>“Noncontiguous Area Cartograms.â€</span> +<em>The Professional Geographer</em> 28 (4): 371–80. +</div> +<div id="ref-osmdata" class="csl-entry" role="doc-biblioentry"> +Padgham, Mark, Bob Rudis, Robin Lovelace, and Maëlle Salmon. 2017. +<span>“Osmdataâ€</span> 2. <a href="https://doi.org/10.21105/joss.00305">https://doi.org/10.21105/joss.00305</a>. +</div> +<div id="ref-Paull16" class="csl-entry" role="doc-biblioentry"> +Paull, John, and Benjamin Hennig. 2016. <span>“Atlas of Organics: Four +Maps of the World of Organic Agriculture.â€</span> <em>Journal of +Organics</em> 3 (1): 25–32. +</div> <div id="ref-sf" class="csl-entry" role="doc-biblioentry"> Pebesma, Edzer. 2018b. <span>“<span></span>Simple Features for r: Standardized Support for Spatial Vector Data<span></span>â€</span> 10. <a href="https://doi.org/10.32614/RJ-2018-009">https://doi.org/10.32614/RJ-2018-009</a>. @@ -202,6 +298,10 @@ for Spatial Data in <span></span>r<span></span>â€</span> 5. <a href="https://CR PROJ contributors. 2021. <em><span>PROJ</span> Coordinate Transformation Software Library</em>. Open Source Geospatial Foundation. <a href="https://proj.org/">https://proj.org/</a>. </div> +<div id="ref-tanaka1950" class="csl-entry" role="doc-biblioentry"> +Tanaka, Kitiro. 1950. <span>“The Relief Contour Method of Representing +Topography on Maps.â€</span> <em>Geographical Review</em> 40 (3): 444. <a href="https://doi.org/10.2307/211219">https://doi.org/10.2307/211219</a>. +</div> <div id="ref-tmap" class="csl-entry" role="doc-biblioentry"> Tennekes, Martijn. 2018. <span>“<span></span>Tmap<span></span>: Thematic Maps in <span></span>r<span></span>â€</span> 84. <a href="https://doi.org/10.18637/jss.v084.i06">https://doi.org/10.18637/jss.v084.i06</a>. @@ -310,8 +410,8 @@ window.document.addEventListener("DOMContentLoaded", function (event) { </script> <nav class="page-navigation"> <div class="nav-page nav-page-previous"> - <a href="./01-introduction.html" class="pagination-link"> - <i class="bi bi-arrow-left-short"></i> <span class="nav-page-text"><span class="chapter-number">1</span> <span class="chapter-title">Introduction</span></span> + <a href="./05-mapping_with_r.html" class="pagination-link"> + <i class="bi bi-arrow-left-short"></i> <span class="nav-page-text"><span class="chapter-number">4</span> <span class="chapter-title">Mapping With R</span></span> </a> </div> <div class="nav-page nav-page-next"> diff --git a/public/search.json b/public/search.json index 20687309dccaa689b25356ae912b0bd37d46e29f..a8c3ebd730e9e125cd27eea8e37781b69b179466 100644 --- a/public/search.json +++ b/public/search.json @@ -32,7 +32,7 @@ "href": "references.html", "title": "References", "section": "", - "text": "Bivand, Roger, Tim Keitt, and Barry Rowlingson. 2022. “Rgdal:\nBindings for the ’Geospatial’ Data Abstraction Library.†https://CRAN.R-project.org/package=rgdal.\n\n\nBivand, Roger, and Colin Rundel. 2021. “Rgeos: Interface to\nGeometry Engine - Open Source (’GEOS’).†https://CRAN.R-project.org/package=rgeos.\n\n\nDunnington, Dewey. 2021. “Ggspatial: Spatial Data Framework for\nGgplot2.†https://CRAN.R-project.org/package=ggspatial.\n\n\nGDAL/OGR contributors. n.d. GDAL/OGR Geospatial Data\nAbstraction Software Library. Open Source Geospatial Foundation. https://gdal.org.\n\n\nGiraud, Timothée. 2022. “Mapsf: Thematic Cartography.†https://CRAN.R-project.org/package=mapsf.\n\n\nGiraud, Timothée, and Nicolas Lambert. 2016. “Cartography: Create\nand Integrate Maps in Your r Workflow†1. https://doi.org/10.21105/joss.00054.\n\n\nHijmans, Robert J. 2022a. “Raster: Geographic Data Analysis and\nModeling.†https://CRAN.R-project.org/package=raster.\n\n\n———. 2022b. “Terra: Spatial Data Analysis.†https://CRAN.R-project.org/package=terra.\n\n\nPebesma, Edzer. 2018b. “Simple Features for r:\nStandardized Support for Spatial Vector Data†10. https://doi.org/10.32614/RJ-2018-009.\n\n\n———. 2018a. “Simple Features for R: Standardized Support for\nSpatial Vector Data.†The R Journal 10 (1): 439. https://doi.org/10.32614/rj-2018-009.\n\n\n———. 2021. “Stars: Spatiotemporal Arrays, Raster and Vector Data\nCubes.†https://CRAN.R-project.org/package=stars.\n\n\nPebesma, Edzer J., and Roger S. Bivand. 2005. “Classes and Methods\nfor Spatial Data in r†5. https://CRAN.R-project.org/doc/Rnews/.\n\n\nPROJ contributors. 2021. PROJ Coordinate Transformation\nSoftware Library. Open Source Geospatial Foundation. https://proj.org/.\n\n\nTennekes, Martijn. 2018. “Tmap: Thematic\nMaps in r†84. https://doi.org/10.18637/jss.v084.i06.\n\n\nWickham, Hadley. 2016. “Ggplot2: Elegant Graphics for Data\nAnalysis.†https://ggplot2.tidyverse.org." + "text": "Agafonkin, Vladimir. 2015. “Leaflet Javascript Libary.â€\n\n\nAppelhans, Tim, Florian Detsch, Christoph Reudenbach, and Stefan\nWoellauer. 2022. “Mapview: Interactive Viewing of Spatial Data in\nr.†https://CRAN.R-project.org/package=mapview.\n\n\nAppelhans, Tim, Kenton Russell, and Lorenzo Busetto. 2020.\n“Mapedit: Interactive Editing of Spatial Data in r.†https://CRAN.R-project.org/package=mapedit.\n\n\nBivand, Roger, Tim Keitt, and Barry Rowlingson. 2022. “Rgdal:\nBindings for the ’Geospatial’ Data Abstraction Library.†https://CRAN.R-project.org/package=rgdal.\n\n\nBivand, Roger, and Colin Rundel. 2021. “Rgeos: Interface to\nGeometry Engine - Open Source (’GEOS’).†https://CRAN.R-project.org/package=rgeos.\n\n\nBrunet, Roger, Robert Ferras, and Hervé Théry. 1993. Les Mots de La\ngéographie: Dictionnaire Critique. 03) 911 BRU.\n\n\nCambon, Jesse, Diego Hernangómez, Christopher Belanger, and Daniel\nPossenriede. 2021. “Tidygeocoder: An r Package for\nGeocoding†6: 3544. https://doi.org/10.21105/joss.03544.\n\n\nCauvin, Colette, Francisco Escobar, and Aziz Serradj. 2013. Thematic\nCartography, Cartography and the Impact of the Quantitative\nRevolution. Vol. 2. John Wiley & Sons.\n\n\nCheng, Joe, Bhaskar Karambelkar, and Yihui Xie. 2022. “Leaflet:\nCreate Interactive Web Maps with the JavaScript ’Leaflet’\nLibrary.†https://CRAN.R-project.org/package=leaflet.\n\n\nDorling, Daniel. 1996. Area Cartograms: Their Use and Creation,\nConcepts and Techniques in Modern Geography. Vol. 59. CATMOG:\nConcepts and Techniques in Modern Geography. Institute of British\nGeographers.\n\n\nDougenik, James A, Nicholas R Chrisman, and Duane R Niemeyer. 1985.\n“An Algorithm to Construct Continuous Area Cartograms.â€\nThe Professional Geographer 37 (1): 75–81.\n\n\nDunnington, Dewey. 2021. “Ggspatial: Spatial Data Framework for\nGgplot2.†https://CRAN.R-project.org/package=ggspatial.\n\n\nGDAL/OGR contributors. n.d. GDAL/OGR Geospatial Data\nAbstraction Software Library. Open Source Geospatial Foundation. https://gdal.org.\n\n\nGilardi, Andrea, and Robin Lovelace. 2021. “Osmextract: Download\nand Import Open Street Map Data Extracts.†https://CRAN.R-project.org/package=osmextract.\n\n\nGiraud, Timothée. 2021a. “Linemap: Line Maps.†https://CRAN.R-project.org/package=linemap.\n\n\n———. 2021b. “Maptiles: Download and Display Map Tiles.†https://CRAN.R-project.org/package=maptiles.\n\n\n———. 2022a. “Mapsf: Thematic Cartography.†https://CRAN.R-project.org/package=mapsf.\n\n\n———. 2022b. “Tanaka: Design Shaded Contour Lines (or Tanaka)\nMaps.†https://CRAN.R-project.org/package=tanaka.\n\n\nGiraud, Timothée, and Nicolas Lambert. 2016. “Cartography: Create\nand Integrate Maps in Your r Workflow†1. https://doi.org/10.21105/joss.00054.\n\n\nGombin, Joel, and Paul-Antoine Chevalier. 2022. “banR: R Client\nfor the BAN API.â€\n\n\nHijmans, Robert J. 2022a. “Raster: Geographic Data Analysis and\nModeling.†https://CRAN.R-project.org/package=raster.\n\n\n———. 2022b. “Terra: Spatial Data Analysis.†https://CRAN.R-project.org/package=terra.\n\n\nJeworutzki, Sebastian. 2020. “Cartogram: Create Cartograms with\nr.†https://CRAN.R-project.org/package=cartogram.\n\n\nLambert, Nicolas. 2015. “Les Anamorphoses Cartographiques.â€\nBlog. Carnet Néocartographique. https://neocarto.hypotheses.org/366.\n\n\nOlson, Judy M. 1976. “Noncontiguous Area Cartograms.â€\nThe Professional Geographer 28 (4): 371–80.\n\n\nPadgham, Mark, Bob Rudis, Robin Lovelace, and Maëlle Salmon. 2017.\n“Osmdata†2. https://doi.org/10.21105/joss.00305.\n\n\nPaull, John, and Benjamin Hennig. 2016. “Atlas of Organics: Four\nMaps of the World of Organic Agriculture.†Journal of\nOrganics 3 (1): 25–32.\n\n\nPebesma, Edzer. 2018b. “Simple Features for r:\nStandardized Support for Spatial Vector Data†10. https://doi.org/10.32614/RJ-2018-009.\n\n\n———. 2018a. “Simple Features for R: Standardized Support for\nSpatial Vector Data.†The R Journal 10 (1): 439. https://doi.org/10.32614/rj-2018-009.\n\n\n———. 2021. “Stars: Spatiotemporal Arrays, Raster and Vector Data\nCubes.†https://CRAN.R-project.org/package=stars.\n\n\nPebesma, Edzer J., and Roger S. Bivand. 2005. “Classes and Methods\nfor Spatial Data in r†5. https://CRAN.R-project.org/doc/Rnews/.\n\n\nPROJ contributors. 2021. PROJ Coordinate Transformation\nSoftware Library. Open Source Geospatial Foundation. https://proj.org/.\n\n\nTanaka, Kitiro. 1950. “The Relief Contour Method of Representing\nTopography on Maps.†Geographical Review 40 (3): 444. https://doi.org/10.2307/211219.\n\n\nTennekes, Martijn. 2018. “Tmap: Thematic\nMaps in r†84. https://doi.org/10.18637/jss.v084.i06.\n\n\nWickham, Hadley. 2016. “Ggplot2: Elegant Graphics for Data\nAnalysis.†https://ggplot2.tidyverse.org." }, { "objectID": "02-data_acquisition.html", @@ -102,7 +102,7 @@ "href": "03-vector_data.html#spatial-selection", "title": "3 Vector Data", "section": "3.5 Spatial selection", - "text": "3.5 Spatial selection\n\n3.5.1 Intersections\nSelection of roads that are intersecting dangkao district\n\nroad <- st_read(\"data_cambodia/cambodia.gpkg\", layer = \"road\", quiet = TRUE)\ndangkao <- district[district$ADM2_EN == \"Dangkao\", ]\ninter <- st_intersects(x = road, y = dangkao, sparse = FALSE)\nhead(inter)\n\n [,1]\n[1,] TRUE\n[2,] TRUE\n[3,] TRUE\n[4,] TRUE\n[5,] TRUE\n[6,] TRUE\n\ndim(inter)\n\n[1] 6 1\n\n\nThe inter object is a matrix which indicates for each of element of the road object (6 elements) whether it intersects each elements the dangkao object (1 element). The dimension of the matrix is therefore indeed 6 rows * 1 column. Note the use of the parameter sparse = FALSE here. It is then possible to create a column from this object:\n\nroad$intersect_dangkao <- inter\nplot(st_geometry(dangkao), col = \"lightblue\")\nplot(st_geometry(road), add = TRUE)\nplot(st_geometry(road[road$intersect_dangkao, ]),\n col = \"tomato\", lwd = 1.5, add = TRUE)\n\n\n\n\n\n3.5.1.1 Difference between sparse = TRUE and sparse = FALSE\n\n\n\n\n\n\nsparse = TRUE\n\n\ninter <- st_intersects(x = grid, y = pt, sparse = TRUE)\ninter\n\nSparse geometry binary predicate list of length 4, where the predicate\nwas `intersects'\n 1: (empty)\n 2: 6, 7\n 3: 1, 4\n 4: 2, 3, 5, 8\n\n\n\nsparse = FALSE\n\n\ninter <- st_intersects(x = grid, y = pt, sparse = FALSE)\nrownames(inter) <- grid$id\ncolnames(inter) <- pt$id\ninter\n\n a b c d e f g h\n1 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE\n2 FALSE FALSE FALSE FALSE FALSE TRUE TRUE FALSE\n3 TRUE FALSE FALSE TRUE FALSE FALSE FALSE FALSE\n4 FALSE TRUE TRUE FALSE TRUE FALSE FALSE TRUE\n\n\n\n\n\n3.5.2 Contains / Within\nSelection of roads contained in the municipality of Dangkao. The function st_within() works like the function st_intersects()\n\nroad$within_dangkao <- st_within(road, dangkao, sparse = FALSE)\nplot(st_geometry(dangkao), col = \"lightblue\")\nplot(st_geometry(road), add = TRUE)\n\n\n\nplot(st_geometry(road[road$within_dangkao, ]), col = \"tomato\",\n lwd = 2, add = TRUE)" + "text": "3.5 Spatial selection\n\n3.5.1 Intersections\nSelection of roads that are intersecting dangkao district\n\nroad <- st_read(\"data_cambodia/cambodia.gpkg\", layer = \"road\", quiet = TRUE) %>% st_cast(\"LINESTRING\")\ndangkao <- district[district$ADM2_EN == \"Dangkao\", ]\ninter <- st_intersects(x = road, y = dangkao, sparse = FALSE)\nhead(inter)\n\n [,1]\n[1,] FALSE\n[2,] FALSE\n[3,] FALSE\n[4,] FALSE\n[5,] FALSE\n[6,] FALSE\n\ndim(inter)\n\n[1] 108285 1\n\n\nThe inter object is a matrix which indicates for each of element of the road object (6 elements) whether it intersects each elements the dangkao object (1 element). The dimension of the matrix is therefore indeed 6 rows * 1 column. Note the use of the parameter sparse = FALSE here. It is then possible to create a column from this object:\n\nroad$intersect_dangkao <- inter\nplot(st_geometry(dangkao), col = \"lightblue\")\nplot(st_geometry(road), add = TRUE)\nplot(st_geometry(road[road$intersect_dangkao, ]),\n col = \"tomato\", lwd = 1.5, add = TRUE)\n\n\n\n\n\n3.5.1.1 Difference between sparse = TRUE and sparse = FALSE\n\n\n\n\n\n\nsparse = TRUE\n\n\ninter <- st_intersects(x = grid, y = pt, sparse = TRUE)\ninter\n\nSparse geometry binary predicate list of length 4, where the predicate\nwas `intersects'\n 1: (empty)\n 2: 6, 7\n 3: 1, 4\n 4: 2, 3, 5, 8\n\n\n\nsparse = FALSE\n\n\ninter <- st_intersects(x = grid, y = pt, sparse = FALSE)\nrownames(inter) <- grid$id\ncolnames(inter) <- pt$id\ninter\n\n a b c d e f g h\n1 FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE\n2 FALSE FALSE FALSE FALSE FALSE TRUE TRUE FALSE\n3 TRUE FALSE FALSE TRUE FALSE FALSE FALSE FALSE\n4 FALSE TRUE TRUE FALSE TRUE FALSE FALSE TRUE\n\n\n\n\n\n3.5.2 Contains / Within\nSelection of roads contained in the municipality of Dangkao. The function st_within() works like the function st_intersects()\n\nroad$within_dangkao <- st_within(road, dangkao, sparse = FALSE)\nplot(st_geometry(dangkao), col = \"lightblue\")\nplot(st_geometry(road), add = TRUE)\nplot(st_geometry(road[road$within_dangkao, ]), col = \"tomato\",\n lwd = 2, add = TRUE)" }, { "objectID": "03-vector_data.html#operation-of-geometries", @@ -117,5 +117,33 @@ "title": "3 Vector Data", "section": "3.7 Measurements", "text": "3.7 Measurements\n\n3.7.1 Create a distance matrix\nIf the dataset’s projection system is specified, the distance are expressed in the projection measurement unit (most often in meter)\n\nmat <- st_distance(x = dist_c, y = dist_c)\nmat[1:5,1:5]\n\nUnits: [m]\n [,1] [,2] [,3] [,4] [,5]\n[1,] 0.0 425993.7 232592.12 298254.12 299106.92\n[2,] 425993.7 0.0 386367.88 414428.82 452431.87\n[3,] 232592.1 386367.9 0.00 67060.05 82853.88\n[4,] 298254.1 414428.8 67060.05 0.00 40553.15\n[5,] 299106.9 452431.9 82853.88 40553.15 0.00\n\n\n\n\n3.7.2 Calculate routes\n The package osrm (R-osrm?) acts as an interface R and the OSRM (luxen-vetter-2011?). This package allows to calculate time and distance matrices, road routes, isochrones. The package uses the OSRM demo server by default. In case of intensive use it is strongly recommended to use your own instance of OSRM (with Docker).\n\n3.7.2.1 Calculate a route\nThe fonction osrmRoute() allows you to calculate routes.\n\nlibrary(sf)\nlibrary(osrm)\nlibrary(maptiles)\ndistrict <- st_read(\"data_cambodia/cambodia.gpkg\",layer = \"district\", quiet = TRUE)\ndistrict <- st_transform(district, 32648)\n\nodongk <- district[district$ADM2_PCODE == \"KH0505\", ] # Itinerary between Odongk district and Toul Kouk\ntakmau <- district[district$ADM2_PCODE == \"KH0811\",]\nroute <- osrmRoute(src = odongk, \n dst = takmau, \n returnclass = \"sf\")\nosm <- get_tiles(route, crop = TRUE)\nplot_tiles(osm)\nplot(st_geometry(route), col = \"#b23a5f\", lwd = 6, add = T)\nplot(st_geometry(route), col = \"#eee0e5\", lwd = 1, add = T)\n\n\n\n\n\n\n3.7.2.2 Calculation of a time matrix\nThe function osrmTable() makes it possible to calculate matrices of distances or times by road.\nIn this example we calculate a time matrix between 2 addresses and health centers in Phnom Penh on foot.\n\nlibrary(sf)\nlibrary(tidygeocoder)\nhospital <- st_read(\"data_cambodia/cambodia.gpkg\",layer= \"hospital\", quiet = TRUE)\n\nhospital_pp <- hospital[hospital$PCODE == \"12\", ] # Selection of health centers in Phnom Penh\n\nadresses <- data.frame(adr = c(\"Royal Palace Park, Phnom Penh Phnom, Cambodia\",\n \"Wat Phnom Daun Penh, Phnom Penh, Cambodia\")) # Geocoding of 2 addresses in Phnom Penh\n\nplaces <- tidygeocoder::geocode(.tbl = adresses,address = adr)\nplaces\n\n# A tibble: 2 × 3\n adr lat long\n <chr> <dbl> <dbl>\n1 Royal Palace Park, Phnom Penh Phnom, Cambodia 11.6 105.\n2 Wat Phnom Daun Penh, Phnom Penh, Cambodia 11.6 105.\n\n# Calculation of the distance matrix between the 2 addresses and the health center in Phnom Penh\n\ncal_mat <- osrmTable(src = places[,c(1,3,2)], \n dst = hospital_pp, \n osrm.profile = \"foot\")\n\ncal_mat$durations[1:2, 1:5]\n\n 684 685 686 687 691\nRoyal Palace Park, Phnom Penh Phnom, Cambodia 56.1 71.9 64.2 40.4 76.5\nWat Phnom Daun Penh, Phnom Penh, Cambodia 60.1 80.5 43.8 32.8 55.6\n\n# Which address has better accessibility to health center in Phnom Penh?\n\nboxplot(t(cal_mat$durations[,]), cex.axis = 0.7)" + }, + { + "objectID": "05-mapping_with_r.html", + "href": "05-mapping_with_r.html", + "title": "4 Mapping With R", + "section": "", + "text": "The fonction mf_map() is the central function of the package mapsf (Giraud 2022a). It makes it possible to carry out most of the usual representations in cartography. These main arguments are:\n\nx, an sf object ;\nvar, the name of variable to present ;\ntype, the type of presentation.\n\n\n\nThe following lines import the spatial information layers located in the geopackage cambodia.gpkg file.\n\nlibrary(sf)\n\n#Import Cambodia country border\ncountry = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"country\", quiet = TRUE)\n#Import provincial administrative border of Cambodia\neducation = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"education\", quiet = TRUE)\n#Import district administrative border of Cambodia\ndistrict = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"district\", quiet = TRUE)\n#Import roads data in Cambodia\nroad = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"road\", quiet = TRUE)\n#Import health center data in Cambodia\nhospital = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"hospital\", quiet = TRUE)\n\n\n\n\nWithout using types specification, the function mf_map() simply display the background map.\n\nlibrary(mapsf)\n\nmf_map(x = district, border = \"white\")\nmf_map(x = country,lwd = 2, col = NA, add = TRUE)\nmf_map(x = road, lwd = .5, col = \"ivory4\", add = TRUE)\nmf_map(x = hospital, pch = 20, cex = 1, col = \"#FE9A2E\", add = TRUE) \n\n\n\n\n\n\n\nProportional symbol maps are used to represent inventory variables (absolute quantitative variables, sum and average make sense). The function mf_map(..., type = \"prop\") proposes this representation.\n\n#District\nmf_map(x = district) \n\n# Proportional symbol \nmf_map(\n x = district, \n var = \"T_POP\",\n val_max = 700000,\n type = \"prop\",\n col = \"#148F77\", \n leg_title = \"Population 2019\"\n)\n\n# Title\nmf_title(\"Distribution of population in provincial level\")\n\n\n\n\n\n\nIt is possible to fix the dimensions of the largest symbol corresponding to a certain value with the arguments inches and val_max. We can use construct maps with comparable proportional symbols.\n\npar(mfrow = c(1,2)) #Displaying two maps facing each other\n\n#district\nmf_map(x = district, border = \"grey90\", lwd = .5) \n# Add male Population\nmf_map(\n x = district, \n var = \"Male\", \n type = \"prop\",\n col = \"#1F618D\",\n inches = 0.2, \n val_max = 300000, \n leg_title = \"Male\", \n leg_val_cex = 0.5,\n)\nmf_title(\"Male Population by Distict\") #Adding map title\n\n#district\nmf_map(x = district, border = \"grey90\", lwd = .5) \n# Add female Population\nmf_map(\n x = district, \n var = \"Female\", \n type = \"prop\",\n col = \"#E74C3C\",\n inches = 0.2, \n val_max = 300000, \n leg_title =\"Female\", \n leg_val_cex = 0.5\n)\nmf_title(\"Female Population by Distict\") #Adding map title\n\n\n\n\nHere we have displayed two maps facing each other, see the point Displaying several maps on the same figure for more details.\n\n\n\n\nChoropleth maps are used to represent ratio variables (relative quantitative variables, mean has meaning, sum has no meaning).\nFor this type of representation, you must first:\n\nchoose a discretization method to transform a continuous statistical series into classes defined by intervals,\nchoose a number of classes,\nchoose a color palette.\n\nThe function mf_map(…, type = “choroâ€)makes it possible to create choroplete maps. The arguments nbreaks and breaks are used to parameterize the discretizations, and the function mf_get_breaks() makes it possible to work on the discretizations outside the function mf_map(). Similarly, the argument palis used to fill in a color palette, but several functions can be used to set the palettes apart from the (mf_get_pal…) function.\n\n# Population density (inhabitants/km2) using the sf::st_area() function\ndistrict$DENS <- 1e6 * district$T_POP / as.numeric(st_area(district)) #Calculate population density \nmf_map(\n x = district,\n var = \"DENS\",\n type = \"choro\",\n breaks = \"quantile\",\n pal = \"BuGn\",\n lwd = 1,\n leg_title = \"Distribution of population\\n(inhabitants per km2)\", \n leg_val_rnd = 0\n)\nmf_title(\"Distribution of the population in (2019)\")\n\n\n\n\n\n\nThe fonction mf_get_breaks() provides the methods of discretization of classic variables: quantiles, average/standard deviation, equal amplitudes, nested averages, Fisher-Jenks, geometric, etc.\n\neducation$enrol_g_pct = 100 * education$enrol_girl/education$t_enrol #Calculate percentage of enrolled girl student\n\nd1 = mf_get_breaks(education$enrol_g_pct, nbreaks = 6, breaks = \"equal\", freq = TRUE)\nd2 = mf_get_breaks(education$enrol_g_pct, nbreaks = 6, breaks = \"quantile\")\nd3 = mf_get_breaks(education$enrol_g_pct, nbreaks = 6, breaks = \"geom\")\nd4 = mf_get_breaks(education$enrol_g_pct, breaks = \"msd\", central = FALSE)\n\n\n\n\n\n\n\n\n\nThe argument pal de mf_map() is dedicated to choosing a color palette. The palettes provided by the function hcl.colors() can be used directly.\n\nmf_map(x = education, var = \"enrol_g_pct\", type = \"choro\",\n breaks = d3, pal = \"Reds 3\")\n\n\n\n\n\n\n\n\n\nThe fonction mf_get_pal() allows you to build a color palette. This function is especially useful for creating balanced asymmetrical diverging palettes.\n\nmypal <- mf_get_pal(n = c(4,6), palette = c(\"Burg\", \"Teal\"))\nimage(1:10, 1, as.matrix(1:10), col=mypal, xlab = \"\", ylab = \"\", xaxt = \"n\",\n yaxt = \"n\",bty = \"n\")\n\n\n\n\n\n\n\nIt is possible to use this mode of presentation in specific implementation also.\n\ndist_c <- st_centroid(district)\nmf_map(district)\nmf_map(\n x = dist_c,\n var = \"DENS\",\n type = \"choro\",\n breaks = \"quantile\",\n nbreaks = 5,\n pal = \"PuRd\",\n pch = 23,\n cex = 1.5,\n border = \"white\",\n lwd = .7,\n leg_pos = \"topleft\",\n leg_title = \"Distribution of population\\n(inhabitants per km2)\", \n leg_val_rnd = 0, \n add = TRUE\n)\nmf_title(\"Distribution of population in (2019)\")\n\n\n\n\n\n\n\n\nTypology maps are used to represent qualitative variables. The function mf_map(..., type = \"typo\") proposes this representation.\n\nmf_map(\n x = district,\n var=\"Status\",\n type = \"typo\",\n pal = c('#E8F9FD','#FF7396','#E4BAD4','#FFE3FE'),\n lwd = .7,\n leg_title = \"\"\n)\nmf_title(\"Administrative status by size of area\")\n\n\n\n\n\n\nThe argument val_order is used to order the categories in the\n\nmf_map(\n x = district,\n var=\"Status\",\n type = \"typo\",\n pal = c('#E8F9FD','#FF7396','#E4BAD4','#FFE3FE'),\n val_order = c(\"1st largest district\", \"2nd largest district\", \"3rd largest district\",\"<4500km2\"),\n lwd = .7,\n leg_title = \"\"\n)\nmf_title(\"Administrative status by size of area\")\n\n\n\n\n\n\n\nWhen the implantation of the layer is punctual, symbols are used to carry the colors of the typology.\n\n#extract centroid point of the district\ndist_ctr <- st_centroid(district[district$Status != \"<4500km2\", ])\nmf_map(district)\nmf_map(\n x = dist_ctr,\n var = \"Status\",\n type = \"typo\",\n cex = 2,\n pch = 22,\n pal = c('#FF7396','#E4BAD4','#FFE3FE'),\n leg_title = \"\",\n leg_pos = \"bottomright\",\n add = TRUE\n)\nmf_title(\"Administrative status by size of area\")\n\n\n\n\n\n\n\n\n#Selection of roads that intersect the city of Siem Reap\npp <- district[district$ADM1_EN == \"Phnom Penh\", ]\nroad_pp <- road[st_intersects(x = road, y = pp, sparse = FALSE), ]\nmf_map(pp)\nmf_map(\n x = road_pp,\n var = \"fclass\",\n type = \"typo\",\n lwd = 1.2,\n pal = mf_get_pal(n = 6, \"Tropic\"),\n leg_title = \"Types of road\",\n leg_pos = \"topright\",\n leg_frame = T,\n add = TRUE\n)\nmf_title(\"Administrative status\")\n\n\n\n\n\n\n\n\nThe function mf_map(..., var = c(\"var1\", \"var2\"), type = \"prop_choro\") represents proportional symbols whose areas are proportional to the values of one variable and whose color is based on the discretization of a second variable. The function uses the arguments of the functions mf_map(..., type = \"prop\") and mf_map(..., type = \"choro\").\n\nmf_map(x = district)\nmf_map(\n x = district,\n var = c(\"T_POP\", \"DENS\"),\n val_max = 500000,\n type = \"prop_choro\",\n border = \"grey60\",\n lwd = 0.5,\n leg_pos = c(\"bottomright\", \"bottomleft\"),\n leg_title = c(\"Population\", \"Density of\\n population\\n(inhabitants per km2)\"),\n breaks = \"q6\",\n pal = \"Blues 3\",\n leg_val_rnd = c(0,1))\nmf_title(\"Population\")\n\n\n\n\n\n\n\nThe function mf_map(..., var = c(\"var1\", \"var2\"), type = \"prop_typo\") represents proportional symbols whose areas are proportional to the values of one variable and whose color is based on the discretization of a second variable. The function uses the arguments of the mf_map(..., type = \"prop\") and function mf_map(..., type = \"typo\").\n\nmf_map(x = district)\nmf_map(\n x = district,\n var = c(\"Area.Km2.\", \"Status\"),\n type = \"prop_typo\",\n pal = c('#E8F9FD','#FF7396','#E4BAD4','#FFE3FE'),\n val_order = c(\"<4500km2\",\"1st largest district\", \"2nd largest district\", \"3rd largest district\"),\n leg_pos = c(\"bottomleft\",\"topleft\"),\n leg_title = c(\"Population\\n(2019)\",\n \"Statut administratif\"),\n)\nmf_title(\"Population\")" + }, + { + "objectID": "05-mapping_with_r.html#layout", + "href": "05-mapping_with_r.html#layout", + "title": "4 Mapping With R", + "section": "4.2 Layout", + "text": "4.2 Layout\nTo be finalized, a thematic map must contain certain additional elements such as: title, author, source, scale, orientation…\n\n4.2.1 Example data\nThe following lines import the spatial information layers located in the geopackage lot46.gpkg file.\n\nlibrary(sf)\ncountry = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"country\", quiet = TRUE) #Import Cambodia country border\neducation = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"education\", quiet = TRUE) #Import provincial administrative border of Cambodia\ndistrict = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"district\", quiet = TRUE) #Import district administrative border of Cambodia\nroad = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"road\", quiet = TRUE) #Import roads data in Cambodia\nhospital = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"hospital\", quiet = TRUE) #Import hospital data in Cambodia\ncases = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"cases\", quiet = TRUE) #Import example data of fever_cases in Cambodia\n\n\n\n4.2.2 Themes\nThe function mf_theme() defines a cartographic theme. Using a theme allows you to define several graphic parameters which are then applied to the maps created with mapsf. These parameters are: the map margins, the main color, the background color, the position and the aspect of the title. A theme can also be defined with the mf_init() and function mf_export().\n\n4.2.2.1 Use a predefined theme\nA series of predefined themes are available by default (see ?mf_theme).\n\nlibrary(mapsf)\n# use of a background color for the figure, to see the use of margin\nopar <- par(mfrow = c(2,2))\n# Using a predefined theme\nmf_theme(\"default\")\nmf_map(district)\nmf_title(\"Theme : 'default'\")\n\nmf_theme(\"darkula\")\nmf_map(district)\nmf_title(\"Theme : 'darkula'\")\n\nmf_theme(\"candy\")\nmf_map(district)\nmf_title(\"Theme : 'candy'\")\n\nmf_theme(\"nevermind\")\nmf_map(district)\nmf_title(\"Theme : 'nevermind'\")\npar(opar)\n\n\n\n\n\n\n4.2.2.2 Modify an existing theme\nIt is possible to modify an existing theme. In this example, we are using the “default†theme and modifying a few settings.\n\nlibrary(mapsf)\nopar <- par(mfrow = c(1,2))\nmf_theme(\"default\")\nmf_map(district)\nmf_title(\"default\")\n\nmf_theme(\"default\", tab = FALSE, font = 4, bg = \"grey60\", pos = \"center\")\nmf_map(district)\nmf_title(\"modified default\")\npar(opar)\n\n\n\n\n\n\n4.2.2.3 Create a theme\nIt is also possible to create a theme.\n\nmf_theme(\n bg = \"lightblue\", # background color\n fg = \"tomato1\", # main color\n mar = c(1,0,1.5,0), # margin\n tab = FALSE, # \"tab\" style for the title\n inner = FALSE, # title inside or outside of map area\n line = 1.5, # space dedicated to title\n pos = \"center\", # heading position\n cex = 1.5, # title size\n font = 2 # font types for title\n)\nmf_map(district)\nmf_title(\"New theme\")\n\n\n\n\n\n\n\n4.2.3 Titles\nThe function mf_title() adds a title to a map.\n\nmf_theme(\"default\")\nmf_map(district)\nmf_title(\"Map title\")\n\n\n\n\nIt is possible to customize the appearance of the title\n\nmf_map(district)\nmf_title(\n txt = \"Map title\", \n pos = \"center\", \n tab = FALSE, \n bg = \"tomato3\", \n fg = \"lightblue\", \n cex = 1.5, \n line = 1.7, \n font = 1, \n inner = FALSE\n)\n\n\n\n\n\n\n4.2.4 Arrow orientation\nThe function mf_arrow() allows you to choose the position and aspect of orientation arrow.\n\nmf_map(district)\nmf_arrow()\n\n\n\n\n\n\n4.2.5 Scale\nThe function mf_scale() allows you to choose the position and the aspect of the scale.\n\nmf_map(district)\nmf_scale(\n size = 60,\n lwd = 1,\n cex = 0.7\n)\n\n\n\n\n\n\n4.2.6 Credits\nThe function mf_credits() displays a line of credits (sources, author, etc.).\n\nmf_map(district)\nmf_credits(\"IRD\\nInstitut Pasteur du Cambodge, 2022\")\n\n\n\n\n\n\n4.2.7 Complete dressing\nThe function mf_layout() displays all these elements.\n\nmf_map(district)\nmf_layout(\n title = \"Cambodia\",\n credits = \"IRD\\nInstitut Pasteur du Cambodge, 2022\",\n arrow = TRUE\n)\n\n\n\n\n\n\n4.2.8 Annotations\n\nmf_map(district)\nmf_annotation(district[district$ADM2_EN == \"Bakan\",], txt = \"Bakan\", col_txt = \"darkred\", halo = TRUE, cex = 1.5)\n\n\n\n\n\n\n4.2.9 Legends\n\nmf_map(district)\nmf_legend(\n type = \"prop\", \n val = c(1000,500,200,10), \n inches = .2, \n title = \"Population\", \n pos = \"topleft\"\n)\nmf_legend(\n type = \"choro\", \n val = c(0,10,20,30,40),\n pal = \"Greens\", \n pos = \"bottomright\", \n val_rnd = 0\n)\n\n\n\n\n\n\n4.2.10 Labels\nThe function mf_label() is dedicated to displaying labels.\n\ndist_selected <- district[st_intersects(district, district[district$ADM2_EN == \"Bakan\", ], sparse = F), ]\n\nmf_map(dist_selected)\nmf_label(\n x = dist_selected,\n var = \"ADM2_EN\",\n col= \"darkgreen\",\n halo = TRUE,\n overlap = FALSE, \n lines = FALSE\n)\nmf_scale()\n\n\n\n\nThe argument halo = TRUE allows to display a slight halo around the labels and the argument overlap = FALSE allows to create non-overlapping labels.\n\n\n4.2.11 Center the map on a region\nThe function mf_init() allows you to initialize a map by centering it on a spatial object.\n\nmf_init(x = dist_selected)\nmf_map(district, add = TRUE)\nmf_map(dist_selected, col = NA, border = \"#29a3a3\", lwd = 2, add = TRUE)\n\n\n\n\n\n\n4.2.12 Displaying several maps on the sam figure\nHere you have to use mfrow of the function par(). The first digit represents the number of of rows and second the number of columns.\n\n# define the figure layout (1 row, 2 columns)\npar(mfrow = c(1, 2))\n\n# first map\nmf_map(district)\nmf_map(district, \"Male\", \"prop\", val_max = 300000)\nmf_title(\"Population, male\")\n\n# second map\nmf_map(district)\nmf_map(district, \"Female\", \"prop\", val_max = 300000)\nmf_title(\"Population, female\")\n\n\n\n\n\n\n4.2.13 Exporting maps\nIt is quite difficult to export figures (maps or others) whose height/width ratio is satisfactory. The default ratio of figures in png format is 1 (480x480 pixels):\n\ndist_filter <- district[district$ADM2_PCODE == \"KH0808\", ]\npng(\"img/dist_filter_1.png\")\nmf_map(dist_filter)\nmf_title(\"Filtered district\")\ndev.off()\n\n\n\n\n\n\nOn this map a lot of space is lost to the left and right of the district.\nThe function mf_export() allows exports of maps whose height/width ratio is controlled and corresponds to that of a spatial object.\n\nmf_export(dist_filter, \"img/dist_filter_2.png\", width = 480)\nmf_map(dist_filter)\nmf_title(\"Filtered district\")\ndev.off()\n\n\n\n\n\n\nThe extent of this map is exactly that of the displayed region.\n\n\n4.2.14 Adding an image to a map\nThis can be useful for adding a logo, a pictograph. The function readPNG() of package png allows the additional images on the figure.\n\nmf_theme(\"default\", mar = c(0,0,0,0))\nlibrary(png)\n\nlogo <- readPNG(\"img/ird_logo.png\") #Import image\npp <- dim(logo)[2:1]*200 #Image dimension in map unit (width and height of the original image)\n\n#The upper left corner of the department's bounding box\nxy <- st_bbox(district)[c(1,4)]\nmf_map(district, col = \"#D1914D\", border = \"white\")\nrasterImage(\n image = logo,\n xleft = xy[1] ,\n ybottom = xy[2] - pp[2],\n xright = xy[1] + pp[1],\n ytop = xy[2]\n)\n\n\n\n\n\n\n4.2.15 Place an item precisely on the map\nThe function locator() allows clicking on the figure and obtaining the coordinate of a point in the coordinate system of the figure (of the map).\n\n# locator(1) # click to get coordinate on map\n# points(locator(1)) # click to plot point on map\n# text(locator(1), # click to place the item on map\n# labels =\"Located any texts on map\", \n# adj = c(0,0))\n\n\nVideo\nlocator()peut être utilisée sur la plupart des graphiques (pas ceux produits avec ggplot2).\n\n\n\n\n\n\nHow to interactively position legends and layout elements on a map with cartography\n\n\n\n\n\n4.2.16 Add shading to a layer\nThe function mf_shadow() allows to create a shadow to a layer of polygons.\n\nmf_shadow(district)\nmf_map(district, add=TRUE)\n\n\n\n\n\n\n4.2.17 Creating Boxes\nThe function mf_inset_on() allows to start creation a box. You must then “close†the box with mf_inset_off().\n\nmf_init(x = dist_selected, theme = \"agolalight\", expandBB = c(0,.1,0,.5)) \nmf_map(district, add = TRUE)\nmf_map(dist_selected, col = \"tomato4\", border = \"tomato1\", lwd = 2, add = TRUE)\n\n# Cambodia inset box\nmf_inset_on(x = country, pos = \"topright\", cex = .3)\nmf_map(country, lwd = .5, border= \"grey90\")\nmf_map(dist_selected, col = \"tomato4\", border = \"tomato1\", lwd = .5, add = TRUE)\nmf_scale(size = 100, pos = \"bottomleft\", cex = .6, lwd = .5)\nmf_inset_off()\n\n# District inset box\nmf_inset_on(x = district, pos = \"bottomright\", cex = .3)\nmf_map(district, lwd = 0.5, border= \"grey90\")\nmf_map(dist_selected, col = \"tomato4\", border = \"tomato1\", lwd = .5, add = TRUE)\nmf_scale(size = 100, pos = \"bottomright\", cex = .6, lwd = .5)\nmf_inset_off()\n\n# World inset box\nmf_inset_on(x = \"worldmap\", pos = \"topleft\")\nmf_worldmap(dist_selected, land_col = \"#cccccc\", border_col = NA, \n water_col = \"#e3e3e3\", col = \"tomato4\")\n\nmf_inset_off()\nmf_title(\"Bakan district and its surroundings\")\nmf_scale(10, pos = 'bottomleft')" + }, + { + "objectID": "05-mapping_with_r.html#d-maps", + "href": "05-mapping_with_r.html#d-maps", + "title": "4 Mapping With R", + "section": "4.3 3D maps", + "text": "4.3 3D maps\n\n4.3.1 linemap\nThe package linemap (Giraud 2021) allows you to make maps made up of lines.\n\nlibrary(linemap)\nlibrary(mapsf)\nlibrary(sf)\nlibrary(dplyr)\n\npp = st_read(\"data_cambodia/PP.gpkg\", quiet = TRUE) # import Phnom Penh administrative border\npp_pop_dens <- getgrid(x = pp, cellsize =1000, var = \"DENs\") # create population density in grid format (pop density/1km)\n\nmf_init(pp)\n\nlinemap(\n x = pp_pop_dens, \n var = \"DENs\",\n k = 1,\n threshold = 5, \n lwd = 1,\n col = \"ivory1\",\n border = \"ivory4\",\n add = T)\n\nmf_title(\"Phnom Penh Population Density, 2019\")\nmf_credits(\"Humanitarian Data Exchange, 2022\\nunit data:km2\")\n\n\n\n# url = \"https://data.humdata.org/dataset/1803994d-6218-4b98-ac3a-30c7f85c6dbc/resource/f30b0f4b-1c40-45f3-986d-2820375ea8dd/download/health_facility.zip\"\n# health_facility.zip = \"health_facility.zip\"\n# download.file(url, destfile = health_facility.zip)\n# unzip(health_facility.zip) # Unzipped files are in a new folder named Health\n# list.files(path=\"Health\")\n\n\n\n4.3.2 Relief Tanaka\nWe use the tanaka package (Giraud 2022b) which provides a method (Tanaka 1950) used to improve the perception of relief.\n\nlibrary(tanaka)\nlibrary(terra)\n\nrpop <- rast(\"data_cambodia/khm_pd_2019_1km_utm.tif\") # Import population raster data (in UTM)\ndistrict = st_read(\"data_cambodia/cambodia.gpkg\", layer = \"district\", quiet = TRUE) # Import Cambodian districts layer\ndistrict <- st_transform(district, st_crs(rpop)) # Transform data into the same coordinate system\n\nmat <- focalMat(x = rpop, d = c(1500), type = \"Gauss\") # Raster smoothing\nrpopl <- focal(x = rpop, w = mat, fun = sum, na.rm = TRUE)\n\n# Mapping\ncols <- hcl.colors(8, \"Reds\", alpha = 1, rev = T)[-1]\nmf_theme(\"agolalight\")\nmf_init(district)\ntanaka(x = rpop, breaks = c(0,10,25,50,100,250,500,64265),\n col = cols, add = T, mask = district, legend.pos = \"n\")\nmf_legend(type = \"choro\", pos = \"bottomright\", \n val = c(0,10,25,50,100,250,500,64265), pal = cols,\n bg = \"#EDF4F5\", fg = NA, frame = T, val_rnd = 0,\n title = \"Population\\nper km2\")\nmf_title(\"Population density of Cambodia, 2019\")\nmf_credits(\"Humanitarian Data Exchange, 2022\",\n bg = \"#EDF4F5\")\n\n\n\n\n\n\n\n\n\n\nThe tanaka package" + }, + { + "objectID": "05-mapping_with_r.html#cartographic-transformation", + "href": "05-mapping_with_r.html#cartographic-transformation", + "title": "4 Mapping With R", + "section": "4.4 Cartographic Transformation", + "text": "4.4 Cartographic Transformation\n\nclassical anamorphosis is a representation of States(or any cells) by rectangle or any polygons according to a quantities attached to them. (…) We strive to keep the general arrangement of meshes or the silhouette of the continent.â€\nBrunet, Ferras, and Théry (1993)\n\n3 types of anamorphoses or cartograms are presented here:\n\nDorling’s cartograms (Dorling 1996)\nNon-contiguous cartograms (Olson 1976)\nContiguous cartograms (Dougenik, Chrisman, and Niemeyer 1985)\n\n\n\n\n\n\n\nA comprehensive course on anamorphoses : Les anamorphoses cartographiques (Lambert 2015).\n\n\n\n\n\n\n\n\n\nMake cartograms with R\n\n\n\nTo make the cartograms we use the package cartogram (Jeworutzki 2020).\n\n4.4.1 Dorling’s cartograms\nThe territories are represented by figures (circles, squares or rectangles) which do not overlap, the surface of which are proportional to a variable. The proportion of the figures are defined according to the starting positions.\n\n\n\n\n\n\n\n\nSpace is quite poorly identified.\nYou can name the circles to get your bearings and/or use the color to make clusters appear and better identify the geographical blocks.\n\n\n\n\n\nThe perception of quantities is very good. The circle sizes are really comarable.\n\n\n\nlibrary(mapsf)\nlibrary(cartogram)\ndistrict <- st_read(\"data_cambodia/cambodia.gpkg\", layer = \"district\" , quiet = TRUE)\ndist_dorling <- cartogram_dorling(x = district, weight = \"T_POP\", k = 0.7)\nmf_map(dist_dorling, col = \"#40E0D0\", border= \"white\")\nmf_label(\n x = dist_dorling[order(dist_dorling$T_POP, decreasing = TRUE), ][1:10,], \n var = \"ADM2_EN\",\n overlap = FALSE, \n # show.lines = FALSE,\n halo = TRUE, \n r = 0.15\n)\nmf_title(\"Population of District - Dorling Cartogram\")\n\n\n\n\nThe parameter k allows to vary the expansion factor of the circles.\n\n\n4.4.2 Non-continuous cartograms\nThe size of the polygons is proportional to a variable. The arrangement of the polygons relative to each other is preserved. The shape of the polygons is similar.\n\n\n\n\n\n(Cauvin, Escobar, and Serradj 2013)\n\n\n\nThe topology of the regions is lost.\n\n\n\n\n\nThe converstion of the polygons shape is optimal.\n\n\n\ndist_ncont <- cartogram_ncont(x = district, weight = \"T_POP\", k = 1.2)\nmf_map(district, col = NA, border = \"#FDFEFE\", lwd = 1.5)\nmf_map(dist_ncont, col = \"#20B2AA\", border= \"white\", add = TRUE)\nmf_title(\"Population of District - Non-continuous cartograms\")\n\n\n\n\nThe parameter k allows to vary the expansion of the polygons.\n\n\n4.4.3 Continuous cartograms\nThe size of the polygons is proportional to variable. The arrangement of the polygons relative to each other is preserved. To maintain contiguity, the sape of the polygons is heavily transformed.\n\n\n\n\n\n(Paull and Hennig 2016)\n\n\n\nThe shape of the polygond is strongly distorted.\n\n\n\n\n\nIt is a “real geographical mapâ€: topology and contiguity are preserved.\n\n\n\ndist_ncont <- cartogram_cont(x = district, weight = \"DENs\", maxSizeError = 6)\n\nMean size error for iteration 1: 15.8686749410166\n\n\nMean size error for iteration 2: 12.1107731631101\n\n\nMean size error for iteration 3: 9.98940057337996\n\n\nMean size error for iteration 4: 8.62323208787643\n\n\nMean size error for iteration 5: 7.60706404894655\n\n\nMean size error for iteration 6: 6.83561617758241\n\n\nMean size error for iteration 7: 10.1399490743501\n\n\nMean size error for iteration 8: 5.79418495291592\n\nmf_map(dist_ncont, col = \"#66CDAA\", border= \"white\", add = FALSE)\nmf_title(\"Population of District - Continuous cartograms\")\nmf_inset_on(district, cex = .2, pos = \"bottomleft\")\nmf_map(district, lwd = .5)\nmf_inset_off()\n\n\n\n\n\n\n4.4.4 Stengths and weaknessses of cartograms\ncartograms are cartographic representations perceived as innovative (although the method is 40 years old). These very generalize images capture quantities and gradients well. These are real communication images that provoke, arouse interest, convey a strong message, challenge.\nBut cartograms induce a loss of visual cues (difficult to find one’s country or region on the map), require a reading effort which can be significant and do not make it possible to manage missing data.\n\n\n\n\nBrunet, Roger, Robert Ferras, and Hervé Théry. 1993. Les Mots de La géographie: Dictionnaire Critique. 03) 911 BRU.\n\n\nCauvin, Colette, Francisco Escobar, and Aziz Serradj. 2013. Thematic Cartography, Cartography and the Impact of the Quantitative Revolution. Vol. 2. John Wiley & Sons.\n\n\nDorling, Daniel. 1996. Area Cartograms: Their Use and Creation, Concepts and Techniques in Modern Geography. Vol. 59. CATMOG: Concepts and Techniques in Modern Geography. Institute of British Geographers.\n\n\nDougenik, James A, Nicholas R Chrisman, and Duane R Niemeyer. 1985. “An Algorithm to Construct Continuous Area Cartograms.†The Professional Geographer 37 (1): 75–81.\n\n\nGiraud, Timothée. 2021. “Linemap: Line Maps.†https://CRAN.R-project.org/package=linemap.\n\n\n———. 2022a. “Mapsf: Thematic Cartography.†https://CRAN.R-project.org/package=mapsf.\n\n\n———. 2022b. “Tanaka: Design Shaded Contour Lines (or Tanaka) Maps.†https://CRAN.R-project.org/package=tanaka.\n\n\nJeworutzki, Sebastian. 2020. “Cartogram: Create Cartograms with r.†https://CRAN.R-project.org/package=cartogram.\n\n\nLambert, Nicolas. 2015. “Les Anamorphoses Cartographiques.†Blog. Carnet Néocartographique. https://neocarto.hypotheses.org/366.\n\n\nOlson, Judy M. 1976. “Noncontiguous Area Cartograms.†The Professional Geographer 28 (4): 371–80.\n\n\nPaull, John, and Benjamin Hennig. 2016. “Atlas of Organics: Four Maps of the World of Organic Agriculture.†Journal of Organics 3 (1): 25–32.\n\n\nTanaka, Kitiro. 1950. “The Relief Contour Method of Representing Topography on Maps.†Geographical Review 40 (3): 444. https://doi.org/10.2307/211219." } ] \ No newline at end of file diff --git a/references.bib b/references.bib index 1433f18604595ddb446dc0ed62461fe0ebbb7baa..5001dad8f7478b1f46ba8cb6e1e8339e3095d920 100644 --- a/references.bib +++ b/references.bib @@ -250,3 +250,84 @@ Library}, date = {2022}, url = {https://CRAN.R-project.org/package=leaflet} } + +@book{Brunet93, + title={Les mots de la g{\'e}ographie: dictionnaire critique}, + author={Brunet, Roger and Ferras, Robert and Th{\'e}ry, Herv{\'e}}, + number={03) 911 BRU}, + year={1993} +} + + +@book{Dorling96, + year = {1996}, + edition = {}, + number = {}, + journal = {}, + pages = {69}, + publisher = {Institute of British Geographers}, + school = {}, + title = {Area cartograms: their use and creation, concepts and techniques in modern geography}, + volume = {59}, + author = {Daniel Dorling}, + editor = {}, + series = {CATMOG: Concepts and Techniques in Modern Geography} +} + +@article{Dougenik85, + title={An algorithm to construct continuous area cartograms}, + author={Dougenik, James A and Chrisman, Nicholas R and Niemeyer, Duane R}, + journal={The Professional Geographer}, + volume={37}, + number={1}, + pages={75--81}, + year={1985}, + publisher={Wiley Online Library} +} + +@article{Olson76, + title={Noncontiguous area cartograms}, + author={Olson, Judy M}, + journal={The Professional Geographer}, + volume={28}, + number={4}, + pages={371--380}, + year={1976}, + publisher={Wiley Online Library} +} + +@article{Paull16, + title={Atlas of Organics: Four maps of the world of organic agriculture}, + author={Paull, John and Hennig, Benjamin}, + journal={Journal of Organics}, + volume={3}, + number={1}, + pages={25--32}, + year={2016} +} + +@book{Cauvin13, + title={Thematic Cartography, Cartography and the Impact of the Quantitative Revolution}, + author={Cauvin, Colette and Escobar, Francisco and Serradj, Aziz}, + volume={2}, + year={2013}, + publisher={John Wiley \& Sons} +} + +@misc{Lambert15, + author = {Nicolas Lambert}, + title = {Les anamorphoses cartographiques}, + journal = {Carnet néocartographique}, + type = {Blog}, + number = {May 11}, + year = {2015}, + howpublished = {\url{https://neocarto.hypotheses.org/366}} +} + +@article{cartogram, + title = {cartogram: Create Cartograms with R}, + author = {Jeworutzki, Sebastian}, + year = {2020}, + date = {2020}, + url = {https://CRAN.R-project.org/package=cartogram} +}