diff --git a/article/.RData b/article/.RData
index 63e30f646e8bdfa1d421643ee217b8e35c8a868e..be74b65cb8337cff9eae74d9df657d828ad50985 100644
Binary files a/article/.RData and b/article/.RData differ
diff --git a/article/article_figures.Rmd b/article/article_figures.Rmd
index e965f8a278288ed506c3cf020bc942c22ce76bc4..43c3bddf1e263c23eeaa8b207d9ac28b5d2d3fe9 100644
--- a/article/article_figures.Rmd
+++ b/article/article_figures.Rmd
@@ -283,25 +283,21 @@ colnames(peak1_tab) <- c("marker","chr","pos","allele\n1","allele\n2",
                  "n\nHM1","n\nHM2","n\nHT","n\nNA")
 colnames(peak3_tab) <- c("marker","chr","pos","allele\n1","allele\n2",
                  "n\nHM1","n\nHM2","n\nHT","n\nNA")
-colnames(peak5_tab) <- c("marker","chr","pos","allele\n1","allele\n2",
-                 "n\nHM1","n\nHM2","n\nHT","n\nNA")
 
 
 narrow_grid <- ggdraw() +
-  draw_plot(pheno_before_annot_data2,0,.75,.5,.25) +
-  draw_plot(pheno_before_annot_data3,.5,.75,.5,.25) +
-  draw_plot(peak1,0,.5,.3,.25) +
-  draw_plot(tableGrob(peak1_tab,rows=NULL),.3,.5,.7,.25) +
-  draw_plot(peak3,0,.25,.3,.25) +
-  draw_plot(tableGrob(peak3_tab,rows=NULL),.3,.25,.7,.25) +
-  draw_plot(peak5,0,0,.3,.25) +
-  draw_plot(tableGrob(peak5_tab,rows=NULL),.3,0,.7,.25) +
-  draw_plot_label(c("A","B","C","D","E","F","G","H"),
-                  c(0,.5,0,.3,0,.3,.5,.7),c(1,1,.75,.75,.5,.5,.25,.25))
+  draw_plot(pheno_before_annot_data2,0,.7,.5,.3) +
+  draw_plot(pheno_before_annot_data3,.5,.7,.5,.3) +
+  draw_plot(peak1,0,.35,.3,.3) +
+  draw_plot(tableGrob(peak1_tab,rows=NULL),.3,.35,.7,.3) +
+  draw_plot(peak3,0,0,.3,.3) +
+  draw_plot(tableGrob(peak3_tab,rows=NULL),.3,0,.7,.3) +
+  draw_plot_label(c("A","B","C","D","E","F"),
+                  c(0,.5,0,.3,0,.3),c(1,1,.65,.65,.3,.3))
 
 narrow_grid
-ggsave(narrow_grid,file="figures/figS3prev.pdf",width=10,height=17)
-ggsave(narrow_grid,file="figures/figS3prev.png",width=10,height=17)
+ggsave(narrow_grid,file="figures/figS3prev.pdf",width=10,height=14)
+ggsave(narrow_grid,file="figures/figS3prev.png",width=10,height=14)
 
 rm(peak1,peak1_tab,peak2,peak2_tab,peak3,peak3_tab,peak5,peak5_tab)
 ```
@@ -336,22 +332,18 @@ ggsave("figures/figS5.pdf",grid_scans,width=14,height = 5)
 
 ## Comparision of non mendelian/wrong alleles markers between the 4 datasets
 
-```{r}
-load("data2/tab2_data2.rda")
-load("data3/tab2_data3.rda")
-load("data4/tab2_data4.rda")
+A REFAIRE!!!!
 
+```{r}
 colnames(tab2_data2) <- c(colnames(tab2_data2)[1:3],paste0(colnames(tab2_data2)[4:ncol(tab2_data2)],".2"))
 colnames(tab2_data3) <- c(colnames(tab2_data3)[1:3],paste0(colnames(tab2_data3)[4:ncol(tab2_data3)],".3"))
-colnames(tab2_data4) <- c(colnames(tab2_data4)[1:3],paste0(colnames(tab2_data4)[4:ncol(tab2_data4)],".4"))
 
-tab_alldata <- full_join(tab2,tab2_data2) %>% full_join(.,tab2_data3) %>% full_join(.,tab2_data4)
+tab_alldata <- full_join(tab2,tab2_data2) %>% full_join(.,tab2_data3)
 
 #keep all markers with non mendelian prop in at least 1 dataset
-prop_rem <- tab_alldata %>% filter((exclude_poly==0&exclude_prop==1) |
-                       (exclude_poly.2==0&exclude_prop.2==1) |
-                       (exclude_poly.3==0&exclude_prop.3==1) |
-                       (exclude_poly.4==0&exclude_prop.4==1))
+prop_rem <- tab_alldata %>% filter((exclude_poly==0&exclude_prop==1) | (exclude_poly==0&exclude_allele==1) |
+                       (exclude_poly.2==0&exclude_prop.2==1) | (exclude_poly.2==0&exclude_allele.2==1) |
+                       (exclude_poly.3==0&exclude_prop.3==1) | (exclude_poly.3==0&exclude_allele.3==1))
 
 nrow(prop_rem)
 
@@ -359,25 +351,24 @@ nrow(prop_rem)
 prop_rem %<>% mutate(exclpr_data1=case_when(exclude_poly==0&exclude_prop==1 ~ 1, T ~ 0)) %>%
               mutate(exclpr_data2=case_when(exclude_poly.2==0&exclude_prop.2==1 ~ 1, T ~ 0)) %>%
               mutate(exclpr_data3=case_when(exclude_poly.3==0&exclude_prop.3==1 ~ 1, T ~ 0)) %>%
-              mutate(exclpr_data4=case_when(exclude_poly.4==0&exclude_prop.4==1 ~ 1, T ~ 0)) %>%
-  mutate(sompr=exclpr_data1+exclpr_data2+exclpr_data3+exclpr_data4) 
+  mutate(sompr=exclpr_data1+exclpr_data2+exclpr_data3) 
 
 #note if marker retained in a data set
 prop_rem %<>% mutate(excl_data1=case_when((exclude_match+exclude_poly+exclude_na+exclude_prop+exclude_allele+exclude_estmap)==0 ~ 0, T ~ 1)) %>%
              mutate(excl_data2=case_when((exclude_match.2+exclude_poly.2+exclude_na.2+exclude_prop.2+exclude_allele.2+exclude_estmap.2)==0 ~ 0, T ~ 1)) %>%
              mutate(excl_data3=case_when((exclude_match.3+exclude_poly.3+exclude_na.3+exclude_prop.3+exclude_allele.3+exclude_estmap.3)==0 ~ 0, T ~ 1)) %>%
-             mutate(excl_data4=case_when((exclude_match.4+exclude_poly.4+exclude_na.4+exclude_prop.4+exclude_allele.4+exclude_estmap.4)==0 ~ 0, T ~ 1)) %>%
-  mutate(som=excl_data1+excl_data2+excl_data3+excl_data4) 
+  mutate(som=excl_data1+excl_data2+excl_data3) 
 
 #number of markers ok in a least 1 dataset
-prop_rem %>% filter(som<4) %>% nrow()
+prop_rem %>% filter(som<3) %>% nrow()
 
 #number of markers always removed
-prop_rem %<>% mutate(notpoly=case_when(som==4 & (exclude_poly+exclude_poly.2+exclude_poly.3+exclude_poly.4==3) ~ 0,
-                                       som==4 & is.na(exclude_poly.2)==TRUE & (exclude_poly+exclude_poly.3+exclude_poly.4==2) ~ 0,
-                                       som==4 & (exclude_poly+exclude_poly.2+exclude_poly.3+exclude_poly.4==0) ~ 2,
-                                       som==4 & (exclude_poly+exclude_poly.2+exclude_poly.3+exclude_poly.4<3) & (exclude_poly+exclude_poly.2+exclude_poly.3+exclude_poly.4>0) ~ 1,
-                                       som==4 & is.na(exclude_poly.2)==TRUE &  (exclude_poly+exclude_poly.3+exclude_poly.4<2) & (exclude_poly+exclude_poly.3+exclude_poly.4>0) ~ 1))
+prop_rem %<>% mutate(notpoly=case_when(som==3 & (exclude_poly+exclude_poly.2+exclude_poly.3==2) ~ 0,
+                                       som==3 & is.na(exclude_poly.2)==TRUE & (exclude_poly+exclude_poly.3==1) ~ 0,
+                                       som==3 & (exclude_poly+exclude_poly.2+exclude_poly.3==0) ~ 2,
+                                       som==3 & is.na(exclude_poly.2)==TRUE & (exclude_poly+exclude_poly.3==0) ~ 2,
+                                       som==3 & (exclude_poly+exclude_poly.2+exclude_poly.3<2) & (exclude_poly+exclude_poly.2+exclude_poly.3>0) ~ 1,
+                                       som==3 & is.na(exclude_poly.2)==TRUE &  (exclude_poly+exclude_poly.3<1) & (exclude_poly+exclude_poly.3>0) ~ 1))
 
 prop_rem %>% group_by(notpoly) %>% summarise(n=n())
 ```
@@ -388,12 +379,14 @@ prop_rem %>% group_by(notpoly) %>% summarise(n=n())
 #keep all markers with non mendelian prop in at least 1 dataset
 map_rem <- tab_alldata %>% filter(exclude_estmap==1 |
                        exclude_estmap.2==1 |
-                       exclude_estmap.3==1 |
-                       exclude_estmap.4==1)
+                       exclude_estmap.3==1)
 
+map_rem %<>% mutate(som=case_when(exclude_match+exclude_poly+exclude_na+exclude_prop+exclude_allele+exclude_estmap==0 ~ 0,
+                                 exclude_match.2+exclude_poly.2+exclude_na.2+exclude_prop.2+exclude_allele.2+exclude_estmap.2==0 ~ 0,
+                                 exclude_match.3+exclude_poly.3+exclude_na.3+exclude_prop.3+exclude_allele.3+exclude_estmap.3==0 ~ 0,))
 ```
 
-11/15 are okay in another cross.
+5/9 are okay in another cross.
 
 
 
diff --git a/article/data3/.RData b/article/data3/.RData
index ad10895c3386d632f2830a8fdadbe074b8b70f64..2e3f9588201ca5ca711337fd7d56792c15c84ff8 100644
Binary files a/article/data3/.RData and b/article/data3/.RData differ
diff --git a/article/data3/cluster/after_1000p.rda b/article/data3/cluster/after_1000p.rda
index f7c7032a73d6747a961bb19e64f9a908078303c0..177f9721c88673d5e30a4c5839febd7b46cb2e26 100755
Binary files a/article/data3/cluster/after_1000p.rda and b/article/data3/cluster/after_1000p.rda differ
diff --git a/article/data3/cluster/before_1000p.rda b/article/data3/cluster/before_1000p.rda
index 404d5240148306fea2fd12572f2c5c9fc34d1efd..64ebb3e182265f353287e3bc64400ca739b68be6 100755
Binary files a/article/data3/cluster/before_1000p.rda and b/article/data3/cluster/before_1000p.rda differ
diff --git a/article/data3/cluster/before_after.err b/article/data3/cluster/before_after.err
index d5323eae115a1184f0b59400d105921c53629023..878b730c418be2fb09d6c5d18f094aea8886cc60 100755
--- a/article/data3/cluster/before_after.err
+++ b/article/data3/cluster/before_after.err
@@ -1,48 +1,21 @@
 Warning messages:
-1: In getsex(cross) :
-  3 individuals with missing sex; assuming they're female
-2: In fixXgeno.f2(cross, alleles) :
+1: In fixXgeno.f2(cross, alleles) :
    --Omitting 332 male heterozygote genotypes on the X chromosome.
-3: In fixXgeno.f2(cross, alleles) :
+2: In fixXgeno.f2(cross, alleles) :
    --There appear to be some individuals of each cross direction, but "pgm" is not provided.
    Check the X chr genotype data and include a "pgm" column in the phenotype data.
    "pgm" was inferred (probably poorly).
    
-4: In getsex(object) :
-  3 individuals with missing sex; assuming they're female
-5: In getsex(object) :
-  3 individuals with missing sex; assuming they're female
-6: In summary.cross(cross) :
+3: In summary.cross(cross) :
   Some markers at the same position on chr 1,2,3,5,6,7,8,9,10,11,12,13,14,15,16,17,18,19,X; use jittermap().
 Warning message:
-In est.map(cross = cross_before, error.prob = 0.01) : Didn't converge!
-Warning messages:
-1: In matchchr(chr, names(x$geno)) : Chr Y not found
-2: In getsex(cross) :
-  3 individuals with missing sex; assuming they're female
-3: In checkcovar(cross, pheno.col, addcovar, intcovar, perm.strata,  :
-  Dropping 3 individuals with missing phenotypes.
-
+In matchchr(chr, names(x$geno)) : Chr Y not found
 Warning messages:
-1: In getsex(cross) :
-  3 individuals with missing sex; assuming they're female
-2: In fixXgeno.f2(cross, alleles) :
+1: In fixXgeno.f2(cross, alleles) :
    --Omitting 27 male heterozygote genotypes on the X chromosome.
-3: In fixXgeno.f2(cross, alleles) :
-   --There appear to be some individuals of each cross direction, but "pgm" is not provided.
-   Check the X chr genotype data and include a "pgm" column in the phenotype data.
-   "pgm" was inferred (probably poorly).
-   
-4: In getsex(object) :
-  3 individuals with missing sex; assuming they're female
-5: In getsex(object) :
-  3 individuals with missing sex; assuming they're female
-6: In summary.cross(cross) :
+2: In summary.cross(cross) :
   Some markers at the same position on chr 1,2,3,5,6,7,8,9,10,11,12,13,14,15,16,17,18,19,X; use jittermap().
-Warning messages:
-1: In matchchr(chr, names(x$geno)) : Chr Y not found
-2: In getsex(cross) :
-  3 individuals with missing sex; assuming they're female
-3: In checkcovar(cross, pheno.col, addcovar, intcovar, perm.strata,  :
-  Dropping 3 individuals with missing phenotypes.
-
+Warning message:
+In est.map(cross = cross_after, error.prob = 0.01) : Didn't converge!
+Warning message:
+In matchchr(chr, names(x$geno)) : Chr Y not found
diff --git a/article/data3/cluster/before_after.out b/article/data3/cluster/before_after.out
index c078d977d7a104ee7a1fb15b18a11e3d370aba04..00f78b3c600828a6c16e096c4be224c9f32a5720 100755
--- a/article/data3/cluster/before_after.out
+++ b/article/data3/cluster/before_after.out
@@ -1,10 +1,10 @@
  --Read the following data:
-	 92  individuals
-	 2774  markers
+	 89  individuals
+	 2762  markers
 	 5  phenotypes
  --Cross type: f2 
  --Read the following data:
-	 92  individuals
-	 2630  markers
+	 89  individuals
+	 2627  markers
 	 5  phenotypes
  --Cross type: f2 
diff --git a/article/data3/cluster/newmap_after.rda b/article/data3/cluster/newmap_after.rda
index d8f9e3c621134e360105e3336e01743ca9c1148b..ab4f2e2773a2b2872cd1c424ed9c0be591212268 100755
Binary files a/article/data3/cluster/newmap_after.rda and b/article/data3/cluster/newmap_after.rda differ
diff --git a/article/data3/cluster/newmap_before.rda b/article/data3/cluster/newmap_before.rda
index 15de2f094045dbeba8fcc31a10b0b3c3ab93d4b1..881845ca435a7de76e4a1d0c4fda9c20f7cb51f4 100755
Binary files a/article/data3/cluster/newmap_before.rda and b/article/data3/cluster/newmap_before.rda differ
diff --git a/article/data3/data3.Rmd b/article/data3/data3.Rmd
index 96ba4038d11a5c8e95481df892448b88aa8fc237..cc0c6d12e4ded854c75fd2e856a75f28f3e019cd 100644
--- a/article/data3/data3.Rmd
+++ b/article/data3/data3.Rmd
@@ -215,8 +215,10 @@ write_rqtl(geno=genos,pheno=phenos,tab=tab2,ref=strains,par1="StrainA",par2="Str
 cross_after2 <- read.cross(format="csv",file="cluster2/cross_after2.csv",
                               genotypes=c("0","1","2"),na.strings=c("NA"), convertXdata=TRUE)
 
-# load rda with newmap
-load("cluster2/newmap_after2.rda")
+cross_after2 <- calc.genoprob(cross_after2, step=2.0, off.end=0.0, 
+                             error.prob=1.0E-4, map.function="haldane", stepwidth="fixed")
+
+newmap_after2 <- est.map(cross=cross_after2,error.prob=0.01)
 
 # plot
 plotMap(cross_after2,newmap_after2,shift=TRUE)
@@ -229,7 +231,9 @@ plotmap_after_data2 <- ~plotMap(cross_after_data3,newmap_after_data3,shift=TRUE,
 
 ```{r after_scan}
 # load rda with perm
-load("cluster2/after_1000p2.rda")
+after_1000p2 <- scanone(cross=cross_after2, 
+                        chr=c("1", "2", "3", "4", "5", "6", "7", "8", "9", "10", "11", "12", "13", "14", "15", "16", "17", "18", "19", "X"), 
+                        pheno.col="Pheno", model="normal", method="em", n.perm=1000, perm.Xsp=FALSE, verbose=FALSE) 
 
 # calculate thresholds
 threshold_after <- summary(after_1000p2,alpha=c(0.05,0.1,0.63)) #donne lod score pour risque 0.05, 0.1, 0.63
@@ -361,9 +365,9 @@ chrs <- c("1", "2", "3", "4", "5", "6", "7", "8", "9", "10", "11", "12", "13", "
 ann_dat_text<-data.frame(
     chr=factor(chrs,
                levels=chrs),
-    lod=c(NA,NA,NA,NA,11,NA,NA,NA,NA,13,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA),
-    label=c(NA,NA,NA,NA,"p4",NA,NA,NA,NA,"p5",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA),
-    x=c(NA,NA,NA,NA,20,NA,NA,NA,NA,27,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA)
+    lod=c(NA,NA,NA,NA,11,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA),
+    label=c(NA,NA,NA,NA,"p4",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA),
+    x=c(NA,NA,NA,NA,20,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA)
 )
 
 pheno_before_annot_data3 <- pheno_before_plot +  geom_text(
@@ -438,67 +442,6 @@ geno_plot4 <- pgmap %>% filter(pos > 1 & pos < 30) %>%
 geno_plot4
 ```
 
-### Peak 5
-
-```{r peak5_zoom}
-peak5 <- qtl_plot(pheno_before,lod=data.frame(group = c("alpha=0.05", "alpha=0.1","alpha=0.63"),
-                 lod = threshold_before[1:3]),
-         ylab="LOD score",
-         title="QTL mapping",
-         x.label = element_blank(),
-         size=0.6,
-         strip.pos="bottom",
-         chr="10",
-         rug=TRUE) +
-    theme(legend.position = "none",
-          strip.background = element_blank(),
-          strip.text.x = element_blank()) +
-    xlab("Position (cM)") +
-    xlim(c(22,42)) +
-    ggtitle("Peak 5: 1 marker and 1 pseudomarker")
-peak5
-```
-
-1 peak on 1 marker and one pseudomarker : S2C102505843 and c10.loc30  postionned between SAH102097335 and S2C102505843.
-
-Here are the infos on genotype counts for these markers:
-
-```{r summary_geno_peak5}
-peak5_tab <- tab_before %>% filter(marker %in% c("SAH102097335","S2C102505843")) %>% select(marker:n_NA)
-peak5_tab 
-```
-
-
-For S2C102505843, all individuals except 1 are homozygous so this marker should be removed. The proportions for SAH102097335 seem correct.
-
-Graph:
-
-```{r geno_plot_peak5}
-phenotypes <- cross_before[["pheno"]]
-map <- cross_before[["geno"]][["10"]][["map"]] 
-map <- tibble(marker=names(map),pos=map)
-genotypes <- cross_before[["geno"]][["10"]][["data"]]
-genotypes <- as_tibble(genotypes)
-phenogeno <- cbind(phenotypes,genotypes)
-phenogeno %<>% pivot_longer(gICR258:S6J105101847,names_to="marker",values_to="genotype")
-pgmap <- full_join(phenogeno,map,by="marker")
-
-geno_plot5 <- pgmap %>% filter(pos > 25 & pos < 35) %>%
-  filter(id %in% sample(phenotypes$id,10)) %>%
-  ggplot(aes(x=pos,y=as.factor(id))) +
-  geom_point(aes(color=as.factor(genotype))) +
-  coord_cartesian(ylim = c(1, 10), expand = TRUE, clip = "off") +
-  annotate(geom="text",y=-1,size=3,
-           x = map %>% filter(pos > 25 & pos < 35) %>% pull(pos),
-           label = map %>% filter(pos > 25 & pos < 35) %>% pull(marker),
-           angle=90) +
-  labs(x="Position (cM)",y="Individual",color="Genotype") +
-  theme_bw() +
-  theme(plot.margin = unit(c(1, 1, 1, 1), "lines"),
-        axis.title.x = element_text(margin = margin(t = 50)))
-geno_plot5
-```
-
 ## Phenotype distributions
 
 ```{r pheno_distrib}
@@ -551,7 +494,7 @@ prop_plot
 
 ```{r}
 tab2_data3 <- tab2
-save(pheno_before_annot_data3,pheno_data3,peak5,peak5_tab,tab2_data3,
+save(pheno_before_annot_data3,pheno_data3,tab2_data3,
      rec_ratios_before_data3,rec_ratios_after_data3,
      plotmap_before_data3,plotmap_after_data3,
      cross_before_data3,newmap_before_data3,cross_after_data3,newmap_after_data3,
diff --git a/article/data3/data3.rda b/article/data3/data3.rda
index 1bae884904de6b32a14eabc2b8325d56e9d029f6..67c72aef1800e7e3ae4f2765da737c1af41204b2 100644
Binary files a/article/data3/data3.rda and b/article/data3/data3.rda differ
diff --git a/article/figures/fig1prev.pdf b/article/figures/fig1prev.pdf
index b0f958431fd3d83cbeb436acf7d23f7c2d0de1e0..0a0158d348d03e980a9920cd5e49b90d40870830 100644
Binary files a/article/figures/fig1prev.pdf and b/article/figures/fig1prev.pdf differ
diff --git a/article/figures/fig2.pdf b/article/figures/fig2.pdf
index 72b317e78bea278729aa13ba869599d8f55a0382..0e7974c7c7a438b3905054d99c0e431d830f7b6a 100644
Binary files a/article/figures/fig2.pdf and b/article/figures/fig2.pdf differ
diff --git a/article/figures/fig3.pdf b/article/figures/fig3.pdf
index d2d36ffcf4f885ae5d2c3951871e28b1e1098a7f..317d34c132d9bbc2605a2d5f7e026b926b736de6 100644
Binary files a/article/figures/fig3.pdf and b/article/figures/fig3.pdf differ
diff --git a/article/figures/figS1.pdf b/article/figures/figS1.pdf
index dd971d6e263068780e46a43dea0e7b94888f4c50..d458ec9e792af0172e82c090f06eb251f8514cb1 100644
Binary files a/article/figures/figS1.pdf and b/article/figures/figS1.pdf differ
diff --git a/article/figures/figS1_old.pdf b/article/figures/figS1_old.pdf
new file mode 100644
index 0000000000000000000000000000000000000000..2cc97cbb547f224fd7151ce6d457635bb2259af6
Binary files /dev/null and b/article/figures/figS1_old.pdf differ
diff --git a/article/figures/figS3prev.pdf b/article/figures/figS3prev.pdf
index 5e85dcde5c819c26a1929f306c6331eebb2fbfe2..1e7e4ca46878663fc8091a41ab5ee1338f7f5437 100644
Binary files a/article/figures/figS3prev.pdf and b/article/figures/figS3prev.pdf differ
diff --git a/article/figures/figS3prev.svg b/article/figures/figS3prev.svg
new file mode 100644
index 0000000000000000000000000000000000000000..1debea42e314afd8d119ca55403c73a045ab2ba8
--- /dev/null
+++ b/article/figures/figS3prev.svg
@@ -0,0 +1,8581 @@
+<?xml version="1.0" encoding="UTF-8" standalone="no"?>
+<!-- Created with Inkscape (http://www.inkscape.org/) -->
+
+<svg
+   version="1.1"
+   id="svg48"
+   width="960"
+   height="1344"
+   viewBox="0 0 960 1344"
+   sodipodi:docname="figS3prev.svg"
+   inkscape:version="1.2 (1:1.2+202206011327+fc4e4096c5)"
+   xmlns:inkscape="http://www.inkscape.org/namespaces/inkscape"
+   xmlns:sodipodi="http://sodipodi.sourceforge.net/DTD/sodipodi-0.dtd"
+   xmlns="http://www.w3.org/2000/svg"
+   xmlns:svg="http://www.w3.org/2000/svg">
+  <defs
+     id="defs52">
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath88">
+      <path
+         d="M 0,705.6 H 360 V 1008 H 0 Z"
+         id="path86" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath98">
+      <path
+         d="M 40.98,746.9 H 56.66 V 985.79 H 40.98 Z"
+         id="path96" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath118">
+      <path
+         d="M 56.66,746.9 H 72.34 V 985.79 H 56.66 Z"
+         id="path116" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath138">
+      <path
+         d="M 72.34,746.9 H 88.02 V 985.79 H 72.34 Z"
+         id="path136" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath158">
+      <path
+         d="m 88.01,746.9 h 15.68 V 985.79 H 88.01 Z"
+         id="path156" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath178">
+      <path
+         d="m 103.69,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path176" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath198">
+      <path
+         d="m 119.37,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path196" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath218">
+      <path
+         d="m 135.04,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path216" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath238">
+      <path
+         d="M 150.72,746.9 H 166.4 V 985.79 H 150.72 Z"
+         id="path236" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath258">
+      <path
+         d="m 166.4,746.9 h 15.68 V 985.79 H 166.4 Z"
+         id="path256" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath278">
+      <path
+         d="m 182.07,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path276" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath298">
+      <path
+         d="m 197.75,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path296" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath322">
+      <path
+         d="m 213.43,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path320" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath342">
+      <path
+         d="m 229.11,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path340" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath362">
+      <path
+         d="m 244.78,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path360" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath382">
+      <path
+         d="m 260.46,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path380" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath402">
+      <path
+         d="m 276.14,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path400" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath422">
+      <path
+         d="m 291.81,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path420" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath442">
+      <path
+         d="m 307.49,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path440" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath462">
+      <path
+         d="m 323.17,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path460" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath482">
+      <path
+         d="m 338.84,746.9 h 15.68 v 238.89 h -15.68 z"
+         id="path480" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath502">
+      <path
+         d="M 40.98,726.88 H 56.66 V 746.9 H 40.98 Z"
+         id="path500" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath510">
+      <path
+         d="M 40.98,726.88 H 56.66 V 746.9 H 40.98 Z"
+         id="path508" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath522">
+      <path
+         d="M 40.98,726.88 H 56.66 V 746.9 H 40.98 Z"
+         id="path520" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath530">
+      <path
+         d="M 40.98,726.88 H 56.66 V 746.9 H 40.98 Z"
+         id="path528" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath540">
+      <path
+         d="M 56.66,726.88 H 72.34 V 746.9 H 56.66 Z"
+         id="path538" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath548">
+      <path
+         d="M 56.66,726.88 H 72.34 V 746.9 H 56.66 Z"
+         id="path546" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath560">
+      <path
+         d="M 56.66,726.88 H 72.34 V 746.9 H 56.66 Z"
+         id="path558" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath568">
+      <path
+         d="M 56.66,726.88 H 72.34 V 746.9 H 56.66 Z"
+         id="path566" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath578">
+      <path
+         d="M 72.34,726.88 H 88.02 V 746.9 H 72.34 Z"
+         id="path576" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath586">
+      <path
+         d="M 72.34,726.88 H 88.02 V 746.9 H 72.34 Z"
+         id="path584" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath598">
+      <path
+         d="M 72.34,726.88 H 88.02 V 746.9 H 72.34 Z"
+         id="path596" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath606">
+      <path
+         d="M 72.34,726.88 H 88.02 V 746.9 H 72.34 Z"
+         id="path604" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath616">
+      <path
+         d="m 88.01,726.88 h 15.68 V 746.9 H 88.01 Z"
+         id="path614" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath624">
+      <path
+         d="m 88.01,726.88 h 15.68 V 746.9 H 88.01 Z"
+         id="path622" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath636">
+      <path
+         d="m 88.01,726.88 h 15.68 V 746.9 H 88.01 Z"
+         id="path634" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath644">
+      <path
+         d="m 88.01,726.88 h 15.68 V 746.9 H 88.01 Z"
+         id="path642" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath654">
+      <path
+         d="m 103.69,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path652" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath662">
+      <path
+         d="m 103.69,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path660" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath674">
+      <path
+         d="m 103.69,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path672" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath682">
+      <path
+         d="m 103.69,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path680" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath692">
+      <path
+         d="m 119.37,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path690" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath700">
+      <path
+         d="m 119.37,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path698" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath712">
+      <path
+         d="m 119.37,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path710" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath720">
+      <path
+         d="m 119.37,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path718" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath730">
+      <path
+         d="m 135.04,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path728" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath738">
+      <path
+         d="m 135.04,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path736" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath750">
+      <path
+         d="m 135.04,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path748" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath758">
+      <path
+         d="m 135.04,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path756" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath768">
+      <path
+         d="M 150.72,726.88 H 166.4 V 746.9 H 150.72 Z"
+         id="path766" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath776">
+      <path
+         d="M 150.72,726.88 H 166.4 V 746.9 H 150.72 Z"
+         id="path774" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath788">
+      <path
+         d="M 150.72,726.88 H 166.4 V 746.9 H 150.72 Z"
+         id="path786" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath796">
+      <path
+         d="M 150.72,726.88 H 166.4 V 746.9 H 150.72 Z"
+         id="path794" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath806">
+      <path
+         d="m 166.4,726.88 h 15.68 V 746.9 H 166.4 Z"
+         id="path804" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath814">
+      <path
+         d="m 166.4,726.88 h 15.68 V 746.9 H 166.4 Z"
+         id="path812" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath826">
+      <path
+         d="m 166.4,726.88 h 15.68 V 746.9 H 166.4 Z"
+         id="path824" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath834">
+      <path
+         d="m 166.4,726.88 h 15.68 V 746.9 H 166.4 Z"
+         id="path832" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath844">
+      <path
+         d="m 182.07,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path842" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath852">
+      <path
+         d="m 182.07,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path850" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath864">
+      <path
+         d="m 182.07,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path862" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath872">
+      <path
+         d="m 182.07,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path870" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath882">
+      <path
+         d="m 197.75,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path880" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath890">
+      <path
+         d="m 197.75,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path888" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath902">
+      <path
+         d="m 197.75,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path900" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath910">
+      <path
+         d="m 197.75,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path908" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath920">
+      <path
+         d="m 213.43,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path918" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath928">
+      <path
+         d="m 213.43,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path926" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath940">
+      <path
+         d="m 213.43,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path938" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath948">
+      <path
+         d="m 213.43,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path946" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath958">
+      <path
+         d="m 229.11,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path956" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath966">
+      <path
+         d="m 229.11,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path964" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath978">
+      <path
+         d="m 229.11,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path976" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath986">
+      <path
+         d="m 229.11,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path984" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath996">
+      <path
+         d="m 244.78,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path994" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1004">
+      <path
+         d="m 244.78,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1002" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1016">
+      <path
+         d="m 244.78,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1014" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1024">
+      <path
+         d="m 244.78,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1022" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1034">
+      <path
+         d="m 260.46,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1032" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1042">
+      <path
+         d="m 260.46,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1040" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1054">
+      <path
+         d="m 260.46,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1052" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1062">
+      <path
+         d="m 260.46,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1060" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1072">
+      <path
+         d="m 276.14,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1070" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1080">
+      <path
+         d="m 276.14,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1078" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1092">
+      <path
+         d="m 276.14,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1090" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1100">
+      <path
+         d="m 276.14,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1098" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1110">
+      <path
+         d="m 291.81,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1108" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1118">
+      <path
+         d="m 291.81,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1116" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1130">
+      <path
+         d="m 291.81,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1128" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1138">
+      <path
+         d="m 291.81,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1136" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1148">
+      <path
+         d="m 307.49,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1146" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1156">
+      <path
+         d="m 307.49,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1154" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1168">
+      <path
+         d="m 307.49,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1166" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1176">
+      <path
+         d="m 307.49,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1174" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1186">
+      <path
+         d="m 323.17,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1184" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1194">
+      <path
+         d="m 323.17,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1192" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1206">
+      <path
+         d="m 323.17,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1204" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1214">
+      <path
+         d="m 323.17,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1212" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1224">
+      <path
+         d="m 338.84,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1222" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1232">
+      <path
+         d="m 338.84,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1230" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1244">
+      <path
+         d="m 338.84,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1242" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1252">
+      <path
+         d="m 338.84,726.88 h 15.68 v 20.02 h -15.68 z"
+         id="path1250" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1880">
+      <path
+         d="M 360,705.6 H 720 V 1008 H 360 Z"
+         id="path1878" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1890">
+      <path
+         d="m 393.48,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path1888" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1910">
+      <path
+         d="m 409.53,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path1908" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1930">
+      <path
+         d="m 425.58,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path1928" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1950">
+      <path
+         d="m 441.63,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path1948" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1970">
+      <path
+         d="m 457.69,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path1968" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath1994">
+      <path
+         d="m 473.74,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path1992" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2014">
+      <path
+         d="m 489.79,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2012" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2034">
+      <path
+         d="m 505.84,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2032" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2054">
+      <path
+         d="m 521.89,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2052" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2074">
+      <path
+         d="M 537.95,746.9 H 554 v 238.89 h -16.05 z"
+         id="path2072" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2094">
+      <path
+         d="m 554,746.9 h 16.05 V 985.79 H 554 Z"
+         id="path2092" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2114">
+      <path
+         d="M 570.05,746.9 H 586.1 V 985.79 H 570.05 Z"
+         id="path2112" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2134">
+      <path
+         d="m 586.1,746.9 h 16.05 V 985.79 H 586.1 Z"
+         id="path2132" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2154">
+      <path
+         d="m 602.16,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2152" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2174">
+      <path
+         d="m 618.21,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2172" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2194">
+      <path
+         d="m 634.26,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2192" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2214">
+      <path
+         d="m 650.31,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2212" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2234">
+      <path
+         d="m 666.36,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2232" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2254">
+      <path
+         d="m 682.42,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2252" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2274">
+      <path
+         d="m 698.47,746.9 h 16.05 v 238.89 h -16.05 z"
+         id="path2272" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2294">
+      <path
+         d="m 393.48,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2292" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2302">
+      <path
+         d="m 393.48,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2300" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2314">
+      <path
+         d="m 393.48,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2312" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2322">
+      <path
+         d="m 393.48,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2320" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2332">
+      <path
+         d="m 409.53,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2330" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2340">
+      <path
+         d="m 409.53,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2338" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2352">
+      <path
+         d="m 409.53,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2350" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2360">
+      <path
+         d="m 409.53,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2358" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2370">
+      <path
+         d="m 425.58,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2368" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2378">
+      <path
+         d="m 425.58,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2376" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2390">
+      <path
+         d="m 425.58,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2388" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2398">
+      <path
+         d="m 425.58,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2396" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2408">
+      <path
+         d="m 441.63,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2406" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2416">
+      <path
+         d="m 441.63,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2414" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2428">
+      <path
+         d="m 441.63,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2426" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2436">
+      <path
+         d="m 441.63,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2434" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2446">
+      <path
+         d="m 457.69,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2444" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2454">
+      <path
+         d="m 457.69,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2452" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2466">
+      <path
+         d="m 457.69,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2464" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2474">
+      <path
+         d="m 457.69,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2472" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2484">
+      <path
+         d="m 473.74,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2482" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2492">
+      <path
+         d="m 473.74,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2490" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2504">
+      <path
+         d="m 473.74,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2502" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2512">
+      <path
+         d="m 473.74,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2510" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2522">
+      <path
+         d="m 489.79,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2520" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2530">
+      <path
+         d="m 489.79,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2528" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2542">
+      <path
+         d="m 489.79,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2540" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2550">
+      <path
+         d="m 489.79,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2548" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2560">
+      <path
+         d="m 505.84,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2558" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2568">
+      <path
+         d="m 505.84,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2566" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2580">
+      <path
+         d="m 505.84,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2578" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2588">
+      <path
+         d="m 505.84,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2586" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2598">
+      <path
+         d="m 521.89,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2596" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2606">
+      <path
+         d="m 521.89,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2604" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2618">
+      <path
+         d="m 521.89,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2616" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2626">
+      <path
+         d="m 521.89,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2624" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2636">
+      <path
+         d="M 537.95,726.88 H 554 v 20.02 h -16.05 z"
+         id="path2634" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2644">
+      <path
+         d="M 537.95,726.88 H 554 v 20.02 h -16.05 z"
+         id="path2642" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2656">
+      <path
+         d="M 537.95,726.88 H 554 v 20.02 h -16.05 z"
+         id="path2654" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2664">
+      <path
+         d="M 537.95,726.88 H 554 v 20.02 h -16.05 z"
+         id="path2662" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2674">
+      <path
+         d="m 554,726.88 h 16.05 V 746.9 H 554 Z"
+         id="path2672" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2682">
+      <path
+         d="m 554,726.88 h 16.05 V 746.9 H 554 Z"
+         id="path2680" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2694">
+      <path
+         d="m 554,726.88 h 16.05 V 746.9 H 554 Z"
+         id="path2692" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2702">
+      <path
+         d="m 554,726.88 h 16.05 V 746.9 H 554 Z"
+         id="path2700" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2712">
+      <path
+         d="M 570.05,726.88 H 586.1 V 746.9 H 570.05 Z"
+         id="path2710" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2720">
+      <path
+         d="M 570.05,726.88 H 586.1 V 746.9 H 570.05 Z"
+         id="path2718" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2732">
+      <path
+         d="M 570.05,726.88 H 586.1 V 746.9 H 570.05 Z"
+         id="path2730" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2740">
+      <path
+         d="M 570.05,726.88 H 586.1 V 746.9 H 570.05 Z"
+         id="path2738" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2750">
+      <path
+         d="m 586.1,726.88 h 16.05 V 746.9 H 586.1 Z"
+         id="path2748" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2758">
+      <path
+         d="m 586.1,726.88 h 16.05 V 746.9 H 586.1 Z"
+         id="path2756" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2770">
+      <path
+         d="m 586.1,726.88 h 16.05 V 746.9 H 586.1 Z"
+         id="path2768" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2778">
+      <path
+         d="m 586.1,726.88 h 16.05 V 746.9 H 586.1 Z"
+         id="path2776" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2788">
+      <path
+         d="m 602.16,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2786" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2796">
+      <path
+         d="m 602.16,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2794" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2808">
+      <path
+         d="m 602.16,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2806" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2816">
+      <path
+         d="m 602.16,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2814" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2826">
+      <path
+         d="m 618.21,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2824" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2834">
+      <path
+         d="m 618.21,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2832" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2846">
+      <path
+         d="m 618.21,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2844" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2854">
+      <path
+         d="m 618.21,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2852" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2864">
+      <path
+         d="m 634.26,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2862" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2872">
+      <path
+         d="m 634.26,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2870" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2884">
+      <path
+         d="m 634.26,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2882" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2892">
+      <path
+         d="m 634.26,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2890" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2902">
+      <path
+         d="m 650.31,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2900" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2910">
+      <path
+         d="m 650.31,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2908" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2922">
+      <path
+         d="m 650.31,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2920" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2930">
+      <path
+         d="m 650.31,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2928" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2940">
+      <path
+         d="m 666.36,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2938" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2948">
+      <path
+         d="m 666.36,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2946" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2960">
+      <path
+         d="m 666.36,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2958" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2968">
+      <path
+         d="m 666.36,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2966" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2978">
+      <path
+         d="m 682.42,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2976" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2986">
+      <path
+         d="m 682.42,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2984" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath2998">
+      <path
+         d="m 682.42,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path2996" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3006">
+      <path
+         d="m 682.42,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path3004" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3016">
+      <path
+         d="m 698.47,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path3014" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3024">
+      <path
+         d="m 698.47,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path3022" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3036">
+      <path
+         d="m 698.47,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path3034" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3044">
+      <path
+         d="m 698.47,726.88 h 16.05 v 20.02 h -16.05 z"
+         id="path3042" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3668">
+      <path
+         d="M 0,352.8 H 216 V 655.2 H 0 Z"
+         id="path3666" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3678">
+      <path
+         d="M 33.48,374.08 H 210.52 V 632.99 H 33.48 Z"
+         id="path3676" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3778">
+      <path
+         d="m 33.48,374.08 h 177.04 v 0 z"
+         id="path3776" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3900">
+      <path
+         d="m 267.31,495.36 h 107.37 v 37.23 H 267.31 Z"
+         id="path3898" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3912">
+      <path
+         d="m 374.68,495.36 h 29.89 v 37.23 h -29.89 z"
+         id="path3910" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3924">
+      <path
+         d="m 404.57,495.36 h 48.03 v 37.23 h -48.03 z"
+         id="path3922" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3936">
+      <path
+         d="m 452.61,495.36 h 41.36 v 37.23 h -41.36 z"
+         id="path3934" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3948">
+      <path
+         d="m 493.97,495.36 h 41.36 v 37.23 h -41.36 z"
+         id="path3946" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3960">
+      <path
+         d="M 535.33,495.36 H 572 v 37.23 h -36.67 z"
+         id="path3958" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3972">
+      <path
+         d="m 572,495.36 h 36.67 v 37.23 H 572 Z"
+         id="path3970" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3984">
+      <path
+         d="m 608.67,495.36 h 31.35 v 37.23 h -31.35 z"
+         id="path3982" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath3996">
+      <path
+         d="m 640.03,495.36 h 28.67 v 37.23 h -28.67 z"
+         id="path3994" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4008">
+      <path
+         d="m 267.31,475.41 h 107.37 v 19.95 H 267.31 Z"
+         id="path4006" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4020">
+      <path
+         d="m 374.68,475.41 h 29.89 v 19.95 h -29.89 z"
+         id="path4018" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4032">
+      <path
+         d="m 404.57,475.41 h 48.03 v 19.95 h -48.03 z"
+         id="path4030" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4044">
+      <path
+         d="m 452.61,475.41 h 41.36 v 19.95 h -41.36 z"
+         id="path4042" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4056">
+      <path
+         d="m 493.97,475.41 h 41.36 v 19.95 h -41.36 z"
+         id="path4054" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4068">
+      <path
+         d="M 535.33,475.41 H 572 v 19.95 h -36.67 z"
+         id="path4066" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4080">
+      <path
+         d="m 572,475.41 h 36.67 v 19.95 H 572 Z"
+         id="path4078" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4092">
+      <path
+         d="m 608.67,475.41 h 31.35 v 19.95 h -31.35 z"
+         id="path4090" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4104">
+      <path
+         d="m 640.03,475.41 h 28.67 v 19.95 h -28.67 z"
+         id="path4102" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4116">
+      <path
+         d="m 267.31,495.36 h 107.37 v 37.23 H 267.31 Z"
+         id="path4114" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4130">
+      <path
+         d="m 267.31,475.41 h 107.37 v 19.95 H 267.31 Z"
+         id="path4128" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4144">
+      <path
+         d="m 374.68,495.36 h 29.89 v 37.23 h -29.89 z"
+         id="path4142" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4158">
+      <path
+         d="m 374.68,475.41 h 29.89 v 19.95 h -29.89 z"
+         id="path4156" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4172">
+      <path
+         d="m 404.57,495.36 h 48.03 v 37.23 h -48.03 z"
+         id="path4170" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4186">
+      <path
+         d="m 404.57,475.41 h 48.03 v 19.95 h -48.03 z"
+         id="path4184" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4200">
+      <path
+         d="m 452.61,495.36 h 41.36 v 37.23 h -41.36 z"
+         id="path4198" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4218">
+      <path
+         d="m 452.61,475.41 h 41.36 v 19.95 h -41.36 z"
+         id="path4216" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4232">
+      <path
+         d="m 493.97,495.36 h 41.36 v 37.23 h -41.36 z"
+         id="path4230" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4250">
+      <path
+         d="m 493.97,475.41 h 41.36 v 19.95 h -41.36 z"
+         id="path4248" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4264">
+      <path
+         d="M 535.33,495.36 H 572 v 37.23 h -36.67 z"
+         id="path4262" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4282">
+      <path
+         d="M 535.33,475.41 H 572 v 19.95 h -36.67 z"
+         id="path4280" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4296">
+      <path
+         d="m 572,495.36 h 36.67 v 37.23 H 572 Z"
+         id="path4294" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4314">
+      <path
+         d="m 572,475.41 h 36.67 v 19.95 H 572 Z"
+         id="path4312" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4328">
+      <path
+         d="m 608.67,495.36 h 31.35 v 37.23 h -31.35 z"
+         id="path4326" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4346">
+      <path
+         d="m 608.67,475.41 h 31.35 v 19.95 h -31.35 z"
+         id="path4344" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4360">
+      <path
+         d="m 640.03,495.36 h 28.67 v 37.23 h -28.67 z"
+         id="path4358" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4378">
+      <path
+         d="m 640.03,475.41 h 28.67 v 19.95 h -28.67 z"
+         id="path4376" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4410">
+      <path
+         d="M 0,0 H 216 V 302.4 H 0 Z"
+         id="path4408" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4420">
+      <path
+         d="M 40.98,21.28 H 210.52 V 280.19 H 40.98 Z"
+         id="path4418" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4522">
+      <path
+         d="m 40.98,21.28 h 169.54 v 0 z"
+         id="path4520" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4644">
+      <path
+         d="m 274.76,152.54 h 96.48 v 37.23 h -96.48 z"
+         id="path4642" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4656">
+      <path
+         d="m 371.24,152.54 h 29.89 v 37.23 h -29.89 z"
+         id="path4654" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4668">
+      <path
+         d="m 401.13,152.54 h 48.03 v 37.23 h -48.03 z"
+         id="path4666" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4680">
+      <path
+         d="m 449.17,152.54 h 41.36 v 37.23 h -41.36 z"
+         id="path4678" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4692">
+      <path
+         d="m 490.53,152.54 h 41.36 v 37.23 h -41.36 z"
+         id="path4690" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4704">
+      <path
+         d="m 531.89,152.54 h 36.67 v 37.23 h -36.67 z"
+         id="path4702" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4716">
+      <path
+         d="m 568.56,152.54 h 36.67 v 37.23 h -36.67 z"
+         id="path4714" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4728">
+      <path
+         d="m 605.23,152.54 h 27.33 v 37.23 h -27.33 z"
+         id="path4726" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4740">
+      <path
+         d="m 632.57,152.54 h 28.67 v 37.23 h -28.67 z"
+         id="path4738" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4752">
+      <path
+         d="m 274.76,132.58 h 96.48 v 19.95 h -96.48 z"
+         id="path4750" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4764">
+      <path
+         d="m 274.76,112.63 h 96.48 v 19.95 h -96.48 z"
+         id="path4762" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4776">
+      <path
+         d="m 371.24,132.58 h 29.89 v 19.95 h -29.89 z"
+         id="path4774" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4788">
+      <path
+         d="m 371.24,112.63 h 29.89 v 19.95 h -29.89 z"
+         id="path4786" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4800">
+      <path
+         d="m 401.13,132.58 h 48.03 v 19.95 h -48.03 z"
+         id="path4798" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4812">
+      <path
+         d="m 401.13,112.63 h 48.03 v 19.95 h -48.03 z"
+         id="path4810" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4824">
+      <path
+         d="m 449.17,132.58 h 41.36 v 19.95 h -41.36 z"
+         id="path4822" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4836">
+      <path
+         d="m 449.17,112.63 h 41.36 v 19.95 h -41.36 z"
+         id="path4834" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4848">
+      <path
+         d="m 490.53,132.58 h 41.36 v 19.95 h -41.36 z"
+         id="path4846" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4860">
+      <path
+         d="m 490.53,112.63 h 41.36 v 19.95 h -41.36 z"
+         id="path4858" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4872">
+      <path
+         d="m 531.89,132.58 h 36.67 v 19.95 h -36.67 z"
+         id="path4870" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4884">
+      <path
+         d="m 531.89,112.63 h 36.67 v 19.95 h -36.67 z"
+         id="path4882" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4896">
+      <path
+         d="m 568.56,132.58 h 36.67 v 19.95 h -36.67 z"
+         id="path4894" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4908">
+      <path
+         d="m 568.56,112.63 h 36.67 v 19.95 h -36.67 z"
+         id="path4906" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4920">
+      <path
+         d="m 605.23,132.58 h 27.33 v 19.95 h -27.33 z"
+         id="path4918" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4932">
+      <path
+         d="m 605.23,112.63 h 27.33 v 19.95 h -27.33 z"
+         id="path4930" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4944">
+      <path
+         d="m 632.57,132.58 h 28.67 v 19.95 h -28.67 z"
+         id="path4942" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4956">
+      <path
+         d="m 632.57,112.63 h 28.67 v 19.95 h -28.67 z"
+         id="path4954" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4968">
+      <path
+         d="m 274.76,152.54 h 96.48 v 37.23 h -96.48 z"
+         id="path4966" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4982">
+      <path
+         d="m 274.76,132.58 h 96.48 v 19.95 h -96.48 z"
+         id="path4980" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath4996">
+      <path
+         d="m 371.24,152.54 h 29.89 v 37.23 h -29.89 z"
+         id="path4994" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5010">
+      <path
+         d="m 274.76,112.63 h 96.48 v 19.95 h -96.48 z"
+         id="path5008" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5024">
+      <path
+         d="m 401.13,152.54 h 48.03 v 37.23 h -48.03 z"
+         id="path5022" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5038">
+      <path
+         d="m 371.24,132.58 h 29.89 v 19.95 h -29.89 z"
+         id="path5036" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5052">
+      <path
+         d="m 449.17,152.54 h 41.36 v 37.23 h -41.36 z"
+         id="path5050" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5070">
+      <path
+         d="m 371.24,112.63 h 29.89 v 19.95 h -29.89 z"
+         id="path5068" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5084">
+      <path
+         d="m 490.53,152.54 h 41.36 v 37.23 h -41.36 z"
+         id="path5082" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5102">
+      <path
+         d="m 401.13,132.58 h 48.03 v 19.95 h -48.03 z"
+         id="path5100" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5116">
+      <path
+         d="m 531.89,152.54 h 36.67 v 37.23 h -36.67 z"
+         id="path5114" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5134">
+      <path
+         d="m 401.13,112.63 h 48.03 v 19.95 h -48.03 z"
+         id="path5132" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5148">
+      <path
+         d="m 568.56,152.54 h 36.67 v 37.23 h -36.67 z"
+         id="path5146" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5166">
+      <path
+         d="m 449.17,132.58 h 41.36 v 19.95 h -41.36 z"
+         id="path5164" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5180">
+      <path
+         d="m 605.23,152.54 h 27.33 v 37.23 h -27.33 z"
+         id="path5178" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5198">
+      <path
+         d="m 449.17,112.63 h 41.36 v 19.95 h -41.36 z"
+         id="path5196" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5212">
+      <path
+         d="m 632.57,152.54 h 28.67 v 37.23 h -28.67 z"
+         id="path5210" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5230">
+      <path
+         d="m 490.53,132.58 h 41.36 v 19.95 h -41.36 z"
+         id="path5228" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5244">
+      <path
+         d="m 490.53,112.63 h 41.36 v 19.95 h -41.36 z"
+         id="path5242" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5258">
+      <path
+         d="m 531.89,132.58 h 36.67 v 19.95 h -36.67 z"
+         id="path5256" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5272">
+      <path
+         d="m 531.89,112.63 h 36.67 v 19.95 h -36.67 z"
+         id="path5270" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5286">
+      <path
+         d="m 568.56,132.58 h 36.67 v 19.95 h -36.67 z"
+         id="path5284" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5300">
+      <path
+         d="m 568.56,112.63 h 36.67 v 19.95 h -36.67 z"
+         id="path5298" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5314">
+      <path
+         d="m 605.23,132.58 h 27.33 v 19.95 h -27.33 z"
+         id="path5312" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5328">
+      <path
+         d="m 605.23,112.63 h 27.33 v 19.95 h -27.33 z"
+         id="path5326" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5342">
+      <path
+         d="m 632.57,132.58 h 28.67 v 19.95 h -28.67 z"
+         id="path5340" />
+    </clipPath>
+    <clipPath
+       clipPathUnits="userSpaceOnUse"
+       id="clipPath5356">
+      <path
+         d="m 632.57,112.63 h 28.67 v 19.95 h -28.67 z"
+         id="path5354" />
+    </clipPath>
+  </defs>
+  <sodipodi:namedview
+     id="namedview50"
+     pagecolor="#ffffff"
+     bordercolor="#000000"
+     borderopacity="0.25"
+     inkscape:showpageshadow="2"
+     inkscape:pageopacity="0.0"
+     inkscape:pagecheckerboard="0"
+     inkscape:deskcolor="#d1d1d1"
+     showgrid="true"
+     inkscape:zoom="0.60491071"
+     inkscape:cx="575.29151"
+     inkscape:cy="860.45756"
+     inkscape:window-width="1848"
+     inkscape:window-height="1016"
+     inkscape:window-x="72"
+     inkscape:window-y="27"
+     inkscape:window-maximized="1"
+     inkscape:current-layer="g56">
+    <inkscape:page
+       x="0"
+       y="0"
+       id="page54"
+       width="960"
+       height="1344"
+       inkscape:export-filename="figs1.pdf"
+       inkscape:export-xdpi="96"
+       inkscape:export-ydpi="96" />
+    <inkscape:grid
+       type="xygrid"
+       id="grid5775" />
+  </sodipodi:namedview>
+  <g
+     id="g56"
+     inkscape:groupmode="layer"
+     inkscape:label="Page 1"
+     transform="matrix(1.3333333,0,0,-1.3333333,0,1344)">
+    <g
+       id="g58" />
+    <g
+       id="g60" />
+    <g
+       id="g62" />
+    <g
+       id="g64" />
+    <g
+       id="g66" />
+    <g
+       id="g68" />
+    <g
+       id="g70" />
+    <g
+       id="g72" />
+    <g
+       id="g74" />
+    <g
+       id="g76" />
+    <g
+       id="g78" />
+    <g
+       id="g80" />
+    <g
+       id="g82">
+      <g
+         id="g84"
+         clip-path="url(#clipPath88)" />
+    </g>
+    <g
+       id="g90" />
+    <g
+       id="g92">
+      <g
+         id="g94"
+         clip-path="url(#clipPath98)">
+        <path
+           d="M 40.98,974.93 H 56.66"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path100" />
+        <path
+           d="M 40.98,949.64 H 56.66"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path102" />
+        <path
+           d="M 40.98,868.04 H 56.66"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path104" />
+        <path
+           d="m 41.7,771.26 v 0 l 0.03,0.19 0.03,7.08 v 0 h 0.02 v 0 0 l 0.05,1.42 v -4.19 l 0.01,-4.42 h 0.01 l 0.14,-2.2 0.11,-1.87 0.07,-0.38 0.03,0.13 0.03,-0.12 0.03,-0.05 0.02,-0.01 0.04,0.05 0.03,-0.39 0.05,0.41 0.18,0.14 v 0 l 0.08,2.22 0.18,6.81 0.03,0.47 0.16,0.57 h 0.04 v -0.01 h 0.03 l 0.02,0.53 v 0 h 0.01 0.02 l 0.02,0.6 0.18,4.51 h 0.11 0.05 l 0.08,-10.98 0.17,-0.17 0.02,0.04 0.03,-4.62 0.01,-8.47 0.1,0.01 0.13,0.82 0.12,5.42 0.08,0.29 0.1,-0.02 0.29,-1.15 0.11,-0.7 0.19,-0.45 0.01,-0.2 0.04,-0.03 0.2,36.34 0.04,-10.7 0.02,-0.17 0.03,-13.05 v 0 l 0.07,0.97 0.06,4.7 0.11,-9.22 0.09,-3.36 0.15,-2.57 0.06,0.51 0.29,-3.88 0.01,-0.14 0.15,-3.84 0.07,-0.06 h 0.03 0.04 0.02 l 0.04,0.81 0.03,-0.39 0.02,-0.2 h 0.03 0.01 l 0.03,-0.18 0.11,-0.06 0.19,0.02 0.11,-0.05 0.09,0.56 0.03,-0.67 0.11,0.06 0.01,1.35 h 0.02 v 0 h 0.02 l 0.01,0.25 0.01,0.12 0.12,-0.49 0.07,0.54 0.03,-0.57 0.07,-1.34 0.02,-0.04 v 0 h 0.01 l 0.12,1.56 0.11,-1.36 0.03,-0.12 0.04,0.36 h 0.07 l 0.02,-0.05 0.05,0.1 0.02,-0.22 0.07,-0.09 v 0 h 0.03 0.01 v 0 h 0.16 l 0.11,1.28 v -0.34 -0.92 h 0.01 v 0 h 0.02 l 0.08,0.67 h 0.03 0.04 0.03 0.03 l 0.03,1.12 h 0.01 v 0 h 0.03 0.01 0.01 l 0.09,0.07 h 0.01 l 0.03,-1.06 0.01,-0.19 h 0.01 v 0.34 h 0.02 0.06 0.02 0.02 0.04 v 0 l 0.03,0.85 v -0.01 l 0.02,0.54 v -0.45 l 0.02,1.27 v 0.07 l 0.07,-2.32 v -0.15 l 0.02,-0.48 h 0.04 0.05 0.02 0.09 l 0.06,-0.02 0.02,0.02 v 0 h 0.02 l 0.09,2.93 v 0.26 h 0.02 v 0.19 l 0.08,1.38 0.09,2.75 0.08,-3.34 0.02,0.12 0.09,0.24 h 0.01 l 0.12,3.67 h 0.08 0.04 l 0.02,-1 0.23,2.74 0.02,0.21 0.09,-1.42 h 0.01 l 0.04,-0.13 h 0.02 l 0.05,-1.16 v 0.27 l 0.01,1.21 h 0.01 v 0 h 0.01 0.04 0.01 0.03 l 0.15,3.64 0.07,-4.21 0.03,0.09 0.3,11.32 0.05,1.07 0.07,-1.48 0.1,2.97 0.07,-1.87 0.01,-0.11 h 0.02 v 0 h 0.01 l 0.09,-4.17 0.17,-4.71 0.19,-5.93 0.1,1.31 0.09,-0.52 0.2,-1.06 0.12,-1.68 v 1.79 h 0.05 v 0 h 0.01 v 0 h 0.01 v 0 0 l 0.01,-2.14 0.1,0.48 0.29,1.44 0.07,0.28 h 0.03 l 0.08,-0.66 h 0.05 l 0.07,1.57 0.14,3.96 h 0.03 0.01 l 0.01,-0.03 0.01,0.03 h 0.07 v 0 h 0.01 l 0.01,-9.59 v 0.02 -0.25 l 0.07,9.62 0.23,7.5 0.29,9.81 0.09,2.34 0.2,4.09 v 0 h 0.01 v 0 0 0 l 0.01,-9.94 0.21,11.29 0.07,2.16 0.14,-3.03 0.13,-14.35 h 0.02 l 0.01,-0.09 0.11,-4.54 0.1,-1.81 v 0 0 h 0.08 0.05 0.02 v 0 0 h 0.03 v 0 0 h 0.04 0.02 0.01 v 0 l 0.1,-6.43 0.01,-1.45 v -5.19 l 0.01,2.57 0.01,4.11 0.01,-2.68 0.06,-2.02 0.04,6.93 v 0"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path106" />
+        <path
+           d="M 40.98,746.9 H 56.66 V 985.79 H 40.98 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path108" />
+      </g>
+    </g>
+    <g
+       id="g110" />
+    <g
+       id="g112">
+      <g
+         id="g114"
+         clip-path="url(#clipPath118)">
+        <path
+           d="M 56.66,974.93 H 72.34"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path120" />
+        <path
+           d="M 56.66,949.64 H 72.34"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path122" />
+        <path
+           d="M 56.66,868.04 H 72.34"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path124" />
+        <path
+           d="m 57.37,758.62 0.05,0.6 0.13,0.95 0.1,-0.57 0.28,-0.97 0.17,-0.09 0.11,3.32 0.03,1.34 0.16,-3.8 0.1,0.01 h 0.28 l 0.09,-0.01 0.09,-0.47 0.1,4.55 0.03,0.05 h 0.02 l 0.09,-3.15 0.01,1.21 0.13,-3.12 0.28,0.55 0.07,0.39 0.06,0.27 0.02,-0.21 0.13,0.1 v 0 l 0.08,-0.79 0.19,8.64 0.01,0.42 0.03,-0.07 0.12,-9.33 0.07,-0.58 0.05,0.05 0.01,0.1 0.02,0.35 0.02,0.69 0.01,-0.86 h 0.07 0.01 v 0 h 0.03 l 0.12,0.51 0.01,0.02 h 0.04 l 0.06,0.33 0.01,0.01 0.05,0.44 0.02,0.24 0.01,0.34 0.06,-1.1 v 0 l 0.02,-0.05 0.02,-0.03 0.02,0.07 0.02,-0.01 v 0.02 h 0.12 0.01 0.03 0.02 v 0 h 0.01 0.03 0.03 0.04 0.01 v -0.37 l 0.08,-0.15 h 0.09 0.01 l 0.02,0.94 0.02,0.62 0.24,-1.02 0.03,0.44 0.05,1.5 0.04,-2.53 0.03,-0.17 0.06,4.41 0.03,-0.42 0.07,5.53 0.06,5.86 0.22,-10.27 0.02,-0.74 h 0.09 v 0 h 0.01 0.01 v 0 0 h 0.02 v 0.02 -0.02 0 h 0.01 v 0 h 0.02 0.01 l 0.09,-0.01 0.28,2.65 0.02,0.32 0.12,8.1 0.11,-8.8 h 0.01 l 0.02,0.45 0.06,1.22 h 0.01 l 0.03,0.29 0.02,3.91 0.12,-3.37 0.04,-1.02 0.13,-3.41 0.06,-0.01 h 0.05 l 0.04,0.84 0.19,3.56 0.05,0.51 v -1.77 l 0.04,22.95 0.03,-10.12 0.2,-14.15 0.02,1.29 0.03,-3.33 0.01,-1.13 0.01,0.29 v -0.06 l 0.03,2.01 0.05,-6.05 0.05,0.21 0.04,10.29 h 0.06 l 0.01,1.7 h 0.01 0.01 0.02 0.01 0.03 l 0.01,-5.6 h 0.02 0.09 l 0.1,-5.48 0.06,-0.36 h 0.01 0.02 l 0.02,-0.02 0.09,3.33 0.01,-0.05 0.03,-0.8 v 0 l 0.04,0.57 0.06,0.95 0.03,-1.73 0.06,0.64 h 0.01 0.01 l 0.05,-0.17 0.02,0.3 0.04,-0.3 0.01,-0.01 v 0 l 0.01,0.01 v -0.01 l 0.03,-0.01 0.01,0.02 v 0 h 0.02 l 0.01,-0.06 v 0 l 0.07,-0.25 0.05,0.1 0.04,-0.14 0.01,1.65 0.03,0.81 0.05,1.35 0.05,0.09 h 0.02 0.01 0.02 0.12 0.01 0.02 0.04 l 0.06,0.5 h 0.05 l 0.11,0.28 0.19,0.56 h 0.01 v 0.02 l 0.08,-0.06 0.28,-1.16 0.09,-0.43 h 0.01 v 0 h 0.01 v 0 h 0.01 l 0.01,-0.03 v 0 l 0.15,0.55 0.14,0.7 0.14,-0.03 0.07,-0.02 v 0.05 0 h 0.04 l 0.04,2.7 0.13,-1.43 v -0.01 l 0.08,0.3 0.06,0.73 v 0 0 l 0.01,-0.04 0.01,0.04 v 0 0.07 l 0.12,-0.03 h 0.01 0.12 v 0 l 0.12,4.33 0.03,-1.33 0.1,-5.37 0.18,4.1 v -0.04 0.05 l 0.02,0.23 h 0.01 l 0.15,-2.39 0.08,5.88 0.01,0.04 0.02,0.09 0.24,-0.91 0.04,1.23 0.09,3.55 0.12,12.42 0.07,-8.18 0.06,-1.42 0.03,0.01 0.08,7.59 h 0.04 l 0.07,-1.54 0.02,-0.43 0.26,5.17 0.17,1.32 0.11,0.36 0.05,0.18 h 0.06 l 0.08,5.71 0.09,7 0.18,-14.08 0.1,-0.67 0.27,-1.33 0.01,-0.38 0.23,-16.58 h 0.04 0.01 0.1 l 0.08,6.84 0.01,-0.85 0.02,-2.75"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path126" />
+        <path
+           d="M 56.66,746.9 H 72.34 V 985.79 H 56.66 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path128" />
+      </g>
+    </g>
+    <g
+       id="g130" />
+    <g
+       id="g132">
+      <g
+         id="g134"
+         clip-path="url(#clipPath138)">
+        <path
+           d="M 72.34,974.93 H 88.01"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path140" />
+        <path
+           d="M 72.34,949.64 H 88.01"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path142" />
+        <path
+           d="M 72.34,868.04 H 88.01"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path144" />
+        <path
+           d="m 73.05,796.7 0.04,3.06 0.02,0.54 0.01,-0.03 v 0.03 h 0.01 0.01 0.02 l 0.22,-6.17 0.03,9.32 0.06,0.83 0.12,-10.65 0.18,-8.86 0.03,-0.15 0.09,0.65 0.24,0.15 0.36,-0.46 0.02,-0.05 0.34,-9.38 0.32,-9.06 0.04,-0.01 0.15,-0.01 0.05,-0.35 0.03,0.2 0.02,0.15 h 0.07 0.02 l 0.02,0.82 0.15,4.79 0.09,-1.69 0.01,-0.31 0.07,0.11 0.03,0.13 v 0.01 l 0.01,0.02 0.01,0.04 0.11,-6.37 h 0.12 l 0.06,-0.45 0.06,-1.68 0.03,23.8 0.01,-27.83 0.13,1.86 0.03,-1.45 0.1,11.43 0.06,0.53 0.09,0.73 0.22,1.08 0.05,-0.05 0.36,-9.59 0.1,-3.31 0.26,0.12 0.05,0.23 0.03,15.23 v 0 h 0.01 0.02 v 0 l 0.02,-0.21 0.03,-0.99 0.09,5.98 0.03,-1.15 0.02,0.02 0.06,-8.58 0.01,-2.25 0.19,5.71 0.03,0.25 0.03,5.43 0.1,-0.02 v 0 h 0.01 l 0.14,-0.03 v 0 l 0.04,0.81 0.01,-0.34 v -0.03 l 0.01,-0.36 h 0.11 l 0.04,-1.59 0.05,-1.64 v 0 0 0 h 0.01 v 0 0 h 0.01 0.01 l 0.05,-8.24 0.08,7.96 0.13,-5.42 0.03,0.76 0.07,2.97 0.09,-0.1 0.01,-0.11 0.03,0.21 v 0 0 0.01 -0.01 h 0.01 0.01 l 0.02,0.35 0.05,5.27 h 0.03 v 0 l 0.04,-0.11 0.28,-9.46 0.03,0.75 0.02,-2.84 0.02,0.01 0.01,11 0.01,3.57 v 0 h 0.06 0.1 v -1.02 0 h 0.01 0.02 l 0.07,-0.62 v 0 0 l 0.09,2.57 0.06,1.62 h 0.01 0.05 l 0.17,-17.59 v 0 l 0.07,20.23 0.01,1.66 h 0.01 l 0.1,8.69 0.03,-0.27 0.01,0.61 v 0 h 0.02 v 0 l 0.04,-4.85 0.14,3.24 0.18,1.7 0.14,-0.44 h 0.02 0.02 0.03 0.02 0.02 0.03 l 0.07,4.58 0.03,9.41 0.13,-8.6 0.03,-1.7 0.03,-3.15 0.33,7.67 0.03,0.45 v 0 l 0.01,0.38 0.04,-0.48 0.28,10.2 0.01,0.24 v 0 l 0.1,-6.13 0.15,-0.24 0.03,-4.52 0.02,-0.22 h 0.03 0.02 0.03 l 0.05,-0.63 0.18,-3.38 v 0 l 0.1,-3.88 0.02,-0.96 0.34,-12.1 v -0.18 h 0.01 l 0.04,-1.08 0.04,0.82 h 0.03 v 0 0 0 h 0.01 v 0 0 0 0 0 0 0 0 0 0 h 0.04 l 0.01,0.12 0.01,-0.12 h 0.08 l 0.09,-2.91 0.02,-0.49 0.06,-0.04 h 0.07 l 0.21,-1.41 0.01,-0.07 h 0.04 l 0.06,0.21 0.17,4.89 0.08,-0.16 0.06,0.58 h 0.18 l 0.12,-0.64 0.02,0.01 h 0.02 l 0.27,3.9 0.05,-0.84 0.15,-2.9 h 0.06 l 0.1,1.42 0.05,0.66 0.36,4.44 0.14,1.51 0.15,4.88 0.07,-8.6 0.06,-0.17 v 0 h 0.01 0.01 0.08 l 0.08,-1.02 0.08,-14.44 0.04,-0.49 0.07,-0.76 0.08,15.04 0.21,-5.96 v -0.02 l 0.08,-20.13 0.12,0.78"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path146" />
+        <path
+           d="M 72.34,746.9 H 88.02 V 985.79 H 72.34 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path148" />
+      </g>
+    </g>
+    <g
+       id="g150" />
+    <g
+       id="g152">
+      <g
+         id="g154"
+         clip-path="url(#clipPath158)">
+        <path
+           d="m 88.01,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path160" />
+        <path
+           d="m 88.01,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path162" />
+        <path
+           d="m 88.01,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path164" />
+        <path
+           d="m 88.73,760.02 0.15,13.97 0.09,-1.8 0.02,3.13 0.07,-0.42 0.01,0.03 0.09,3.03 h 0.06 l 0.1,-0.79 0.04,0.79 h 0.02 v 0.34 l 0.03,1.76 h 0.03 l 0.02,0.63 0.03,0.61 0.07,1.42 v 0 l 0.05,0.38 0.09,8.81 0.01,2.72 0.04,11.89 0.08,-1.69 v -0.37 l 0.06,-5.97 0.1,-3.35 0.05,-0.71 0.04,-0.46 0.01,-7.92 0.02,0.05 0.03,-1.06 v -0.36 l 0.08,-6.41 0.15,6.34 v -0.41 l 0.08,-3.35 h 0.02 0.1 0.05 l 0.04,0.35 h 0.04 v 0 l 0.09,-0.14 0.24,-0.82 0.3,-3.29 h 0.03 0.19 0.12 v 0 0 0 h 0.01 0.01 0.01 0.02 l 0.19,-4.65 0.11,2.73 0.14,1.13 h 0.01 l 0.01,1.29 0.01,1.13 h 0.01 0.01 l 0.13,-0.43 0.01,-0.25 0.33,-5.77 0.01,-0.2 0.02,-0.03 0.16,1.79 0.01,-1.79 0.09,-8.81 0.04,0.6 0.24,8 0.04,0.24 0.01,-0.33 0.04,1.3 0.13,0.27 h 0.12 l 0.02,0.16 0.02,-0.01 0.04,-0.8 0.09,-1.89 0.04,0.91 0.02,-0.78 0.04,-2.69 0.13,-2.72 v 0 0 l 0.01,0.1 0.12,2.2 0.01,0.25 h 0.02 v 0 l 0.1,1.21 v 0 h 0.01 0.05 l 0.01,-1.77 0.01,-0.14 v 0 l 0.06,0.14 0.01,-1.3 h 0.02 0.05 l 0.01,0.12 0.04,-0.07 0.02,-0.05 0.01,-0.01 0.02,-1.14 0.09,-0.6 0.07,-0.78 h 0.16 v 0 l 0.05,-2.62 0.01,1.03 0.04,0.04 0.03,0.02 0.01,-0.07 0.03,0.01 h 0.02 l 0.05,-2.82 0.19,2.44 0.01,0.18 0.01,0.01 0.04,-1.33 0.03,-0.5 0.03,-1.67 0.06,0.02 0.01,0.05 h 0.01 v 0 0 l 0.03,-0.3 0.07,0.68 0.03,-0.05 0.21,-0.5 h 0.01 l 0.01,-0.11 h 0.01 0.02 l 0.01,-0.04 h 0.01 l 0.05,-0.02 0.14,1.7 0.18,-1.37 0.04,-0.09 0.21,4.11 v 0 h 0.01 l 0.07,0.17 0.01,0.02 0.11,1.01 0.08,2.67 0.04,-1.64 v 0 l 0.09,1.52 0.13,2.12 0.05,-1.12 0.06,-4.49 0.09,0.2 0.25,0.33 0.08,1.68 0.11,2.35 0.09,-0.95 h 0.01 0.01 l 0.06,17.12 0.04,14.5 0.01,-0.15 0.33,-17.65 0.19,-14.32 0.02,-1.44 0.05,-0.99 0.01,0.1 0.06,4.62 v -0.1 l 0.21,-5.14 0.12,-1.38 0.02,0.62 0.06,1.87 0.25,-0.92 0.07,0.29 h 0.01 l 0.07,0.6 0.18,9.51 0.04,0.05 0.03,-7.04 0.23,-1.81 0.03,0.01 0.05,0.36 0.28,11.29 0.03,2.15 0.18,-0.95 h 0.12 0.02 l 0.14,15.55 0.17,1.23 0.08,0.69 h 0.14 l 0.02,2.21 0.08,0.01 h 0.01 0.02 l 0.06,0.56 0.03,-0.56 v 0 -0.08 l 0.02,0.08 h 0.06 l 0.14,-2.78 0.13,-0.01 0.13,-4.26 0.07,-5.03 0.09,-10.2 v 0 h 0.08 0.06 0.01 l 0.05,-0.36 0.04,-1.02 0.21,-6.61 0.09,-0.67 0.03,-1.12 0.17,-3.42 0.08,0.84 h 0.07 0.03 0.06"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path166" />
+        <path
+           d="m 88.01,746.9 h 15.68 V 985.79 H 88.01 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path168" />
+      </g>
+    </g>
+    <g
+       id="g170" />
+    <g
+       id="g172">
+      <g
+         id="g174"
+         clip-path="url(#clipPath178)">
+        <path
+           d="m 103.69,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path180" />
+        <path
+           d="m 103.69,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path182" />
+        <path
+           d="m 103.69,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path184" />
+        <path
+           d="m 104.4,763.8 0.09,-0.09 0.16,3.34 0.01,1.33 0.03,0.32 v -3.98 l 0.02,-0.01 0.02,0.01 v 0 h 0.01 l 0.27,0.45 0.04,-0.08 0.06,-0.06 h 0.01 l 0.04,-0.61 0.09,0.19 0.03,0.39 h 0.03 l 0.07,0.36 0.1,1.14 h 0.01 0.04 0.09 0.04 0.04 0.01 l 0.02,-2.69 0.08,0.63 0.02,-0.07 0.02,-0.05 0.18,0.66 0.07,0.26 0.02,0.4 0.12,3.38 0.11,0.81 0.03,0.18 0.15,5.26 0.1,-4.17 0.05,-0.17 0.24,-0.76 0.01,0.44 h 0.02 l 0.06,-1.79 v 0 l 0.32,0.76 0.14,0.54 0.05,4.05 0.03,0.19 0.11,2.33 0.07,1.43 0.07,0.78 v 4.58 l 0.18,-2.69 0.03,-1.49 0.07,0.46 h 0.04 l 0.19,5.52 0.1,-0.44 0.06,1.99 h 0.01 l 0.15,11.53 0.31,-39.38 0.02,-0.13 0.15,0.89 0.02,-1.38 0.01,-0.1 0.04,0.18 0.02,-0.13 0.03,0.25 0.03,-0.8 h 0.02 0.02 v 0 l 0.15,1.52 0.16,-0.1 0.2,5.35 0.08,31.5 0.04,-0.35 0.04,-0.31 v 12.09 h 0.01 l 0.16,-5.83 v 4.07 h 0.12 0.12 l 0.15,-4.57 0.03,3.07 v -0.12 l 0.02,1.66 0.33,17.76 0.02,0.31 0.04,0.51 H 111 l 0.07,25.2 v 0 0 h 0.01 0.02 0.03 0.02 l 0.09,-3.08 0.01,-0.48 h 0.04 v 0 l 0.03,-0.02 v 0.02 h 0.01 l 0.07,-14.24 0.06,-1.56 h 0.06 0.04 l 0.26,0.01 0.01,9.72 0.01,-0.04 v 0.03 l 0.04,-60.18 0.01,0.09 0.05,2.3 0.04,57.8 0.01,-2.17 0.05,-1 v 0 h 0.01 v 0 0 h 0.01 v 0 h 0.01 l 0.09,-0.95 v 0 h 0.05 0.07 0.02 v 0 l 0.02,-13.88 0.03,0.26 0.08,6.5 0.02,-0.4 v 0.68 l 0.01,-0.03 v 0 0 l 0.01,-0.05 0.03,0.05 0.02,-13.4 0.02,-0.02 0.12,-0.17 h 0.02 0.04 l 0.06,-0.74 0.06,-1.13 0.02,-0.29 0.1,-3.43 0.04,1.14 0.07,1.16 0.04,1.35 h 0.08 0.03 v 0 0.63 h 0.02 0.05 0.03 0.05 0.01 0.04 0.01 l 0.08,0.11 0.33,0.51 0.04,0.07 v 0 h 0.02 l 0.02,0.04 h 0.01 v 0 l 0.03,-11.28 0.18,-0.36 h 0.02 0.06 0.04 l 0.02,0.11 0.07,-0.11 h 0.02 l 0.12,0.09 0.03,0.27 0.14,10.03 0.07,-0.21 0.08,-0.01 0.12,0.03 0.21,0.05 0.03,0.01 0.26,0.1 h 0.03 0.18 l 0.13,3.72 0.02,-0.19 0.02,0.34 0.31,-9.64 0.23,-7.86 0.09,-4.73 0.06,-13.17 h 0.05 l 0.22,3.05 0.15,-0.92 0.11,-2.42 0.06,3.74 0.23,5.9 0.05,-1.74 0.03,-7.19 0.02,0.39 0.32,7.02 0.16,2.1 h 0.04 l 0.13,-6.35 0.32,-20.56 0.04,-1.53 0.22,-2.98"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path186" />
+        <path
+           d="m 103.69,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path188" />
+      </g>
+    </g>
+    <g
+       id="g190" />
+    <g
+       id="g192">
+      <g
+         id="g194"
+         clip-path="url(#clipPath198)">
+        <path
+           d="m 119.37,974.93 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path200" />
+        <path
+           d="m 119.37,949.64 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path202" />
+        <path
+           d="m 119.37,868.04 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path204" />
+        <path
+           d="m 120.08,757.79 h 0.01 0.02 l 0.12,0.32 0.04,0.19 h 0.08 l 0.1,0.98 0.06,0.85 h 0.08 0.01 l 0.01,-0.29 h 0.05 0.08 l 0.03,-1.75 0.05,0.29 0.23,1.75 0.11,-1.69 0.03,1.32 0.01,0.55 0.05,-2.16 v 0 h 0.02 l 0.02,2.26 h 0.03 l 0.24,-1.65 0.29,-0.98 v 0.01 l 0.08,-0.01 h 0.02 0.01 v 0 h 0.03 0.03 0.03 0.02 0.03 l 0.05,-0.02 0.04,0.02 0.11,0.03 0.03,0.04 h 0.01 l 0.1,0.03 0.06,-0.03 0.17,-0.01 0.36,4.21 0.01,0.03 0.2,1.97 0.17,0.09 0.29,1.37 0.04,-2.96 0.05,-2.24 0.01,2.1 0.36,-3.03 0.01,-0.07 0.08,2.92 0.02,0.28 0.05,0.1 0.21,-0.54 0.01,-0.03 0.19,-3.44 v 0 0 l 0.17,1.09 v 0 0 l 0.26,1.15 0.02,-0.24 h 0.01 l 0.08,5.17 v 0.32 l 0.11,-2.66 0.04,-0.01 0.09,-0.6 0.13,5.34 0.01,1.27 0.1,1.42 0.12,5.4 0.04,2.75 0.07,-2.75 0.03,-0.84 0.18,-7.19 h 0.04 l 0.04,-3.08 0.11,-0.81 0.01,0.01 0.05,0.41 0.06,-0.41 0.1,-0.01 0.11,-2.24 0.04,0.82 v -0.08 l 0.08,-2.37 0.26,3.77 0.03,-0.11 0.01,-0.05 0.03,0.16 0.02,-0.48 h 0.05 v 0 l 0.01,0.08 0.06,-0.92 0.04,2.08 v 6.97 l 0.15,-0.72 0.18,-1.01 0.07,-9.77 0.12,4.19 0.21,8.29 0.03,-7.52 0.13,3.83 0.23,1.52 h 0.03 0.08 l 0.03,0.4 0.05,0.72 0.06,1.01 h 0.14 v 0 h 0.11 l 0.01,-0.52 0.02,-0.69 h 0.05 l 0.03,-4.3 0.24,-2.12 v -0.22 h 0.03 0.19 0.18 0.01 0.01 v 0 h 0.01 l 0.2,-4.55 0.11,1.1 0.03,0.02 h 0.01 0.03 0.01 v 0 l 0.06,1.88 0.1,-0.6 h 0.01 0.03 l 0.05,0.82 v 0 l 0.04,0.67 0.04,-0.05 0.01,-0.01 h 0.02 0.01 l 0.06,4.04 0.19,-5.94 0.08,4.23 0.04,-0.06 0.33,-1.3 0.23,-2.54 0.02,9.38 h 0.03 l 0.04,3.01 0.04,-11.2 0.01,0.13 0.37,-0.52 0.01,-0.01 0.03,0.03 0.09,5.18 v 0 h 0.01 l 0.03,1.23 0.01,0.53 0.15,-0.51 0.04,-5.6 0.01,-2 0.17,10.25 0.03,0.34 0.06,-1.53 0.03,-0.29 0.07,-2.12 0.01,-0.27 0.25,-6.12 0.05,2.47 0.06,-0.65 0.37,-3.28 0.37,-2.4 0.16,-0.67 0.02,17.27 h 0.1 l 0.09,-1.11 0.03,-0.35 h 0.03 l 0.01,-0.37 0.06,-15.39 0.04,1.04"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path206" />
+        <path
+           d="m 119.37,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path208" />
+      </g>
+    </g>
+    <g
+       id="g210" />
+    <g
+       id="g212">
+      <g
+         id="g214"
+         clip-path="url(#clipPath218)">
+        <path
+           d="m 135.04,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path220" />
+        <path
+           d="m 135.04,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path222" />
+        <path
+           d="m 135.04,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path224" />
+        <path
+           d="m 135.76,783.96 v 0 0 0 0 l 0.01,-0.04 v 0 0 0 0 h 0.01 v 0 0 h 0.02 v 0 0 0 0 0 h 0.01 v 0 l 0.06,4.52 0.02,-4.22 h 0.02 v 0 0 0 l 0.01,-16 v -0.05 16.06 h 0.01 l 0.1,-23.21 0.01,0.08 0.01,33.71 0.03,-0.72 0.05,-1.21 h 0.02 0.01 l 0.25,0.01 0.3,-0.01 v 0 0 0 0 l 0.03,2.93 0.02,-2.75 0.14,-7.6 h 0.02 0.03 0.04 l 0.02,-0.07 h 0.05 v 0 h 0.01 v 0 l 0.01,-9.31 0.03,-0.23 0.01,9.21 v 0.33 h 0.05 l 0.22,1.27 0.3,1.73 0.03,1.99 0.14,-6.72 0.17,-11.06 0.02,0.15 v 0 h 0.07 0.08 v 0 h 0.03 l 0.15,0.21 0.21,0.33 h 0.01 v 0 l 0.01,-0.2 0.09,-2.37 0.06,-1.47 h 0.05 0.01 l 0.21,-5.67 0.01,-0.29 v 0 l 0.02,0.24 v 0 h 0.08 v 0 h 0.01 l 0.03,-0.22 h 0.04 0.01 0.04 0.01 0.08 0.03 l 0.04,-0.04 0.03,0.04 h 0.1 l 0.02,-1.92 v 0 l 0.01,0.01 0.02,-0.07 v -2.4 l 0.08,-0.35 0.03,0.09 0.29,2.04 0.05,-0.39 0.01,0.12 0.04,0.54 0.05,-3.19 v 0 h 0.01 l 0.05,0.07 0.03,-0.08 v 0 l 0.09,0.08 v 0 l 0.12,0.83 0.09,3.33 0.07,2.29 0.05,0.49 0.11,1.08 0.03,-3.21 0.02,-0.78 v -0.08 l 0.02,-0.67 h 0.01 l 0.04,1.12 v 0 0.24 l 0.01,-3.94 v -0.17 l 0.01,0.03 0.02,-0.03 v 4.18 h 0.01 l 0.04,-3.26 0.01,0.05 v 0.04 l 0.03,0.51 0.01,0.17 v 0 h 0.01 l 0.04,1.06 h 0.01 l 0.01,-2.87 v 0 h 0.01 l 0.11,-0.02 0.03,1.3 v 0 l 0.06,-0.28 0.24,-1.06 0.09,0.18 0.01,0.04 0.1,-0.57 h 0.01 l 0.21,0.14 0.08,0.07 0.1,1.13 0.09,-1.13 0.03,0.15 0.03,-0.06 0.1,-0.17 0.18,-0.04 0.02,0.1 0.01,0.22 v 0 l 0.01,0.09 0.1,2.53 0.06,1.12 h 0.01 l 0.03,0.17 0.09,-2.75 h 0.04 0.11 0.08 l 0.05,-1.04 h 0.02 l 0.07,-0.27 0.07,-0.16 v 0 h 0.01 v 0 h 0.01 v 0 h 0.04 l 0.08,-0.2 0.03,2.17 h 0.02 0.01 v 0 h 0.06 0.06 v 0 0 h 0.01 0.03 0.08 0.01 0.04 l 0.03,2.53 h 0.01 l 0.02,-0.05 0.03,-1.35 v -0.02 h 0.03 l 0.21,-1.89 0.09,0.79 v 0 h 0.01 v 2.17 -2.36 l 0.05,-1.61 h 0.01 0.01 0.01 l 0.02,-0.19 h 0.05 0.03 0.09 0.05 0.01 0.01 0.02 l 0.05,-0.07 v 0 l 0.15,0.2 v 0.02 l 0.09,0.03 0.12,0.01 h 0.02 l 0.06,2.08 v 0 h 0.02 l 0.09,-1.12 0.01,0.44 0.13,1.25 h 0.08 0.02 0.01 0.01 0.02 0.05 v 0 l 0.01,-0.18 0.01,-0.11 0.06,0.29 0.11,-1 0.02,-0.15 v 0 0 h 0.02 0.02 0.01 v 0 0 h 0.01 v 0 0 h 0.01 v 0 0 h 0.01 v 0 h 0.01 v 0 h 0.01 v 0 l 0.03,-0.43 0.26,-0.01 0.03,-0.02 0.04,-0.31 0.22,-0.28 0.1,0.29 0.02,0.31 v 0 0 h 0.05 0.01 v 0 h 0.05 0.02 0.01 0.02 v 0 h 0.01 v 0 0 h 0.02 0.12 0.09 0.05 v 0 h 0.01 0.06 0.05 0.06 0.01 0.06 0.27 0.06 l 0.02,0.09 0.24,-0.79 0.07,0.12 v 0 0 l 0.23,4.48 0.03,3.83 0.02,-1.38 0.03,-1.6 v 0 0 l 0.06,-5.58 0.05,-0.31 0.04,15.96 0.02,0.13 0.11,-5.47 0.04,-2.16 0.07,-0.54 0.22,-2.55 0.29,-3.78 0.03,2.63 0.04,2.03 v 0 h 0.01 0.01 0.06 l 0.03,-2.72 h 0.03 v 0 l 0.05,-2.49 0.1,3.26 0.33,8.42 0.05,0.2 0.05,-0.74 0.02,7.91 0.04,-2.27 0.01,0.01"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path226" />
+        <path
+           d="m 135.04,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path228" />
+      </g>
+    </g>
+    <g
+       id="g230" />
+    <g
+       id="g232">
+      <g
+         id="g234"
+         clip-path="url(#clipPath238)">
+        <path
+           d="M 150.72,974.93 H 166.4"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path240" />
+        <path
+           d="M 150.72,949.64 H 166.4"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path242" />
+        <path
+           d="M 150.72,868.04 H 166.4"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path244" />
+        <path
+           d="m 151.43,759.98 0.02,0.02 0.01,-0.02 h 0.02 0.03 0.01 0.02 l 0.04,0.5 0.08,-0.5 0.16,0.03 0.03,0.01 0.14,-0.82 0.09,1.18 0.06,-0.96 0.04,-1.23 0.02,0.46 0.06,1.75 h 0.01 l 0.02,0.04 0.25,0.14 0.03,-0.14 h 0.02 0.11 v 0 l 0.12,0.13 0.11,-0.13 0.04,0.05 0.1,0.23 h 0.16 l 0.06,0.64 0.01,0.06 0.01,-2.63 0.03,1.39 0.01,0.58 0.39,-0.27 0.14,2.77 0.16,-2.44 0.08,-0.07 0.12,-1.03 0.04,-0.27 h 0.1 l 0.13,1.07 0.04,0.4 0.01,-3.16 0.14,0.42 0.01,1.65 0.08,0.24 0.1,-0.09 0.21,-0.15 0.01,0.04 0.04,0.51 h 0.12 0.02 0.17 0.11 0.01 0.01 0.06 l 0.01,-0.02 0.02,-0.08 0.04,0.1 h 0.01 v 0 h 0.03 v 0 l 0.02,0.03 0.26,-0.85 0.03,-0.1 0.09,-0.24 0.01,-0.02 v 0 l 0.1,-0.17 0.05,-0.05 0.11,1.4 0.01,0.25 0.01,-0.01 0.02,0.01 h 0.04 0.1 0.03 v 0 h 0.01 v 0 h 0.04 0.08 l 0.02,0.24 h 0.02 0.14 0.02 0.02 l 0.03,4.16 0.01,-2.28 v 0.01 l 0.16,-2.66 0.27,5.08 0.05,-4.67 0.04,0.07 0.03,0.34 0.05,0.71 h 0.01 l 0.04,0.76 0.17,1.68 h 0.04 0.01 0.01 v 0 l 0.01,1.4 h 0.04 0.12 v 0 l 0.27,2.03 0.15,1.14 h 0.01 0.17 v 0 h 0.01 v 0 l 0.04,-1.53 0.07,-3.03 0.15,4.56 H 159 l 0.11,2.34 0.07,1.17 v 0 h 0.05 l 0.18,-0.07 0.05,0.94 0.04,-11.14 v 0.07 l 0.05,1.04 v 0 h 0.03 l 0.05,2.59 0.02,0.01 v -0.04 h 0.01 0.17 0.05 0.08 0.08 v 0 h 0.02 0.03 l 0.18,0.67 0.1,0.48 v -0.13 l 0.01,-0.23 h 0.07 0.06 0.07 0.04 l 0.03,0.62 0.08,1.58 0.3,-2.95 0.21,-1.52 v 0 l 0.05,7.91 0.02,-1.69 0.11,1.69 0.03,0.36 0.19,-1.83 0.16,1.35 0.17,1.28 0.16,2.23 0.06,-0.7 0.38,-5.18 0.08,-0.83 0.01,0.2 0.02,-0.22 v 0 h 0.05 l 0.02,1 0.06,-1 0.14,0.49 0.02,0.05 0.37,-2.47 0.08,-0.59 0.3,-1.05 0.21,-2.5 0.18,6.99 0.38,-0.22 0.12,-0.02 0.06,-0.08 h 0.02 0.01 l 0.18,1.05 0.02,0.19 h 0.01 0.02 v 0 l 0.01,0.06 0.03,-6.64 0.27,-2.59 0.02,-0.61 0.17,9.48 0.02,-0.01 0.11,3.54 0.08,1.52 0.05,0.81"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path246" />
+        <path
+           d="M 150.72,746.9 H 166.4 V 985.79 H 150.72 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path248" />
+      </g>
+    </g>
+    <g
+       id="g250" />
+    <g
+       id="g252">
+      <g
+         id="g254"
+         clip-path="url(#clipPath258)">
+        <path
+           d="m 166.4,974.93 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path260" />
+        <path
+           d="m 166.4,949.64 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path262" />
+        <path
+           d="m 166.4,868.04 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path264" />
+        <path
+           d="m 167.11,778.6 0.03,0.24 0.02,-0.25 0.06,-3.69 h 0.03 l 0.04,-0.09 0.04,1.33 0.03,-1.72 v 0.01 0 h 0.01 l 0.13,0.4 0.38,-0.56 0.02,-0.03 v 0.06 l 0.01,-0.11 0.32,2.15 h 0.04 0.01 v 0 h 0.03 0.03 l 0.01,-3.95 0.01,-1.26 h 0.01 l 0.02,-0.22 0.26,-3.01 0.08,-0.93 0.31,-0.43 0.26,-0.48 0.13,-1.82 v -0.44 l 0.29,2.76 0.09,-0.49 0.18,-5.91 0.16,1.2 0.05,13.12 0.11,-14.88 0.06,-0.32 0.1,-0.27 0.11,-0.13 0.1,-0.12 h 0.17 0.02 v 0 h 0.01 l 0.01,-0.01 0.01,0.01 h 0.01 l 0.06,-0.55 0.12,-0.4 h 0.27 0.05 l 0.02,0.17 h 0.09 l 0.11,0.06 0.02,-0.06 h 0.03 l 0.02,0.07 0.04,-0.02 0.04,-0.01 0.28,-0.24 0.07,0.04 0.15,0.42 0.05,-0.18 h 0.05 0.05 l 0.08,0.09 0.13,0.16 h 0.05 l 0.21,0.03 h 0.04 l 0.07,0.11 0.05,2.3 0.1,0.44 0.02,-1.12 0.1,-0.32 0.09,-0.24 0.24,3.57 0.06,1.5 0.01,0.52 0.06,-2.35 0.14,-0.92 0.04,1.53 0.14,-0.09 0.17,-0.1 0.16,0.58 0.05,-0.01 0.03,-0.24 0.08,-3.59 h 0.02 l 0.04,-0.9 V 759 l 0.04,-0.17 0.01,0.01 0.1,-0.36 0.03,0.8 0.04,-0.05 0.19,-0.09 0.02,1.39 0.06,0.06 h 0.07 l 0.04,2.05 0.05,1.86 0.03,3.73 0.03,3.16 0.28,0.01 h 0.01 l 0.06,2.62 0.05,4.75 0.09,-5.97 0.01,-0.35 h 0.03 0.08 0.05 l 0.01,-0.42 0.03,-1.92 v 0 l 0.01,0.06 0.08,-0.06 h 0.01 l 0.07,-1.69 0.12,2.22 0.06,1.61 0.39,9.69 0.14,3.01 0.24,-5.68 0.04,-1.14 h 0.15 l 0.01,0.47 0.08,-0.73 0.11,-12 0.02,-2.23 0.24,15.5 h 0.03 0.1 0.02 0.02 0.06 v 0 h 0.05 v 0 l 0.04,0.03 h 0.01 0.16 0.02 v 0 l 0.22,-1.1 0.17,-9.29 0.06,-3.23 h 0.08 l 0.18,-0.45 0.06,-1.61 0.19,-1.65 0.04,0.85 0.16,2.42 0.39,2.58 0.24,-3.93 0.1,-1.07 0.01,2.6 0.03,0.02 0.04,-0.03 0.2,-2.53 0.15,-0.08 0.03,-0.02 v 0.01 l 0.35,-2.72 0.05,0.49 0.14,0.13 0.17,-0.69"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path266" />
+        <path
+           d="m 166.4,746.9 h 15.68 V 985.79 H 166.4 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path268" />
+      </g>
+    </g>
+    <g
+       id="g270" />
+    <g
+       id="g272">
+      <g
+         id="g274"
+         clip-path="url(#clipPath278)">
+        <path
+           d="m 182.07,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path280" />
+        <path
+           d="m 182.07,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path282" />
+        <path
+           d="m 182.07,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path284" />
+        <path
+           d="m 182.79,773.97 0.02,-0.13 0.07,-3.17 0.06,-1.36 0.23,-3.94 0.01,-0.13 h 0.01 0.1 0.02 0.01 v 0 l 0.1,0.63 0.01,-0.28 0.07,0.94 h 0.03 v 0 l 0.02,0.74 0.03,1.36 v 0 l 0.04,4.32 v 0 -4.32 h 0.01 l 0.02,-7.68 0.02,-0.23 0.12,-0.8 0.14,1.24 0.21,3.61 0.15,-2.3 0.02,0.38 0.15,3.28 0.01,-0.24 0.12,-4.79 0.1,0.76 0.13,1.24 0.02,1.63 0.06,0.75 h 0.01 0.06 l 0.02,-0.02 0.08,-1.85 0.38,-3.5 0.13,-0.86 0.07,-0.97 0.18,0.57 0.02,0.26 0.36,1.37 0.38,4.09 0.15,0.68 h 0.02 0.02 v 0 0 h 0.01 v 0 l 0.04,1.11 0.07,-1.11 v 0 h 0.03 0.01 v 0 0 0 0 h 0.01 0.01 v 0 h 0.01 v 0 0.01 l 0.01,-0.01 h 0.03 v 0 h 0.04 0.01 l 0.26,1.08 v 0 l 0.03,-0.02 0.38,-3.63 0.04,-0.76 0.29,3.86 0.01,1.88 v 0 0 0 h 0.01 v 0 0 0 0 l 0.02,-0.01 v 0.01 l 0.01,-0.03 0.04,-0.06 0.01,-1.11 0.33,-5.47 0.27,-1.85 0.03,0.85 0.08,0.73 0.11,-0.11 0.12,2.22 0.09,0.53 h 0.02 l 0.04,-0.67 0.21,-2.96 0.02,-1.25 0.14,0.4 0.01,0.1 0.38,1.68 0.03,0.04 0.14,-1.51 0.06,0.16 0.05,-0.47 0.03,0.42 h 0.03 v -0.01 l 0.04,-0.03 0.03,-0.01 0.11,1.99 0.21,3.51 0.03,-0.06 0.23,0.02 0.15,-0.28 0.32,1.49 h 0.07 0.02 l 0.03,-2.4 h 0.05 0.18 0.02 l 0.05,-1.2 0.03,-0.09 0.24,-1.77 0.14,3.27 0.38,7.88 0.07,0.31 h 0.09 l 0.07,-10.44 0.1,0.77 0.05,2.72 0.11,2.59 0.2,-5.4 0.04,-3.06 0.03,-0.01 0.38,0.45 0.38,1.32 0.14,0.46 h 0.09 l 0.15,0.12 0.38,0.01 0.14,-0.13 0.18,3.22 0.06,0.04 0.14,-0.33 0.24,3.03 0.27,2.59 0.11,-2.44 0.2,-9.52 0.18,0.75 0.15,1.09 h 0.01 l 0.02,22.5 0.2,-1.83 0.18,-2.97"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path286" />
+        <path
+           d="m 182.07,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path288" />
+      </g>
+    </g>
+    <g
+       id="g290" />
+    <g
+       id="g292">
+      <g
+         id="g294"
+         clip-path="url(#clipPath298)">
+        <path
+           d="m 197.75,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path300" />
+        <path
+           d="m 197.75,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path302" />
+        <path
+           d="m 197.75,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path304" />
+        <path
+           d="m 198.46,760.13 0.09,0.22 h 0.03 0.02 v 0 l 0.09,-1.64 h 0.03 v 0 h 0.01 v 0 l 0.06,0.42 0.01,-0.1 0.06,-0.32 h 0.02 v 0 l 0.22,0.39 0.01,-0.55 0.01,-0.21 h 0.02 v 0.08 l 0.12,3.78 0.04,0.14 0.07,-1.98 0.11,1.08 0.25,3.1 0.09,0.79 0.01,0.46 0.14,-0.8 0.08,-4.21 0.1,-0.53 0.26,-1.39 0.08,0.33 0.19,1.29 h 0.04 0.04 l 0.04,11.41 0.03,0.33 0.3,-1.23 0.02,-7.03 0.02,-2.98 0.05,-2.5 0.16,6.41 0.05,7.2 0.08,144.66 0.2,-151.86 0.13,-2.29 0.06,-0.99 h 0.14 v 0 0.01 l 0.02,-1.39 v -0.08 l 0.06,-0.23 0.06,0.07 0.01,0.02 h 0.01 0.07 0.1 v 0 h 0.05 v -0.07 h 0.02 0.08 0.16 l 0.14,2.03 0.04,0.7 0.34,6.68 0.1,1.5 0.16,-0.25 0.07,-3.6 0.02,-3.11 0.13,2.51 0.05,1.15 0.14,-5.98 0.07,-2.68 0.06,6.55 0.1,-1.05 0.1,2.99 0.01,-0.17 0.26,-6.53 0.02,2.65 0.03,0.81 0.02,-1.66 h 0.01 0.03 l 0.15,-1.51 0.14,1.61 0.01,5.28 0.01,-2.97 0.03,-6.86 v 0 l 0.03,0.12 0.06,0.96 0.08,-0.06 0.01,2.64 0.12,-1.74 0.05,-0.62 0.04,0.03 0.05,-0.71 0.1,0.08 h 0.1 0.01 0.01 v 0 l 0.14,-0.01 0.08,0.01 v 0 h 0.03 l 0.04,2.74 0.03,-0.4 0.2,-2.28 0.14,-0.89 0.29,0.35 0.03,-0.48 v 0 h 0.02 l 0.15,0.5 v 0 0 0 l 0.08,0.03 v -0.03 h 0.02 v 0 h 0.01 l 0.02,0.34 0.04,1.36 h 0.01 0.05 v 0 h 0.02 0.27 0.01 l 0.05,1.38 0.08,3.23 0.2,1.8 0.21,3.16 v -0.53 l 0.13,1.34 0.04,0.43 v 0 h 0.01 0.01 v 0 h 0.02 v 0 h 0.01 l 0.03,0.15 0.17,-0.15 0.03,-3.12 h 0.02 v 0 l 0.16,0.78 0.17,-0.32 0.13,-0.22 0.07,-1.86 0.14,1.88 0.04,0.44 0.14,6.32 h 0.01 l 0.15,1.75 0.03,-1.06 v 0 h 0.01 0.08 l 0.04,0.88 0.03,-0.79 0.04,-0.13 v 0 l 0.03,0.05 h 0.01 0.02 v 0 l 0.02,-0.25 0.01,-0.1 v 0 h 0.01 v 0 l 0.01,-0.01 0.04,-0.1 0.01,-3.4 h 0.01 v 0 0 h 0.01 v 0 0 0 h 0.19 l 0.01,-0.3 0.07,-4.95 0.01,-1.21 0.22,-1.07 h 0.02 l 0.08,0.75 0.18,1.68 0.05,0.34 0.05,1.72 0.06,-1.03 0.3,-4.1 0.04,-0.26 0.34,-3.46 0.08,-0.39 0.15,-0.4 h 0.11 0.06 l 0.06,-0.26 0.06,0.02 v -0.12 l 0.15,2.47 0.01,0.19 h 0.11 0.03 l 0.13,-0.2 0.06,-0.24 0.34,-1.61 0.06,-0.23"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path306" />
+        <text
+           xml:space="preserve"
+           transform="scale(1,-1)"
+           style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#e41a1c;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text310"
+           x="200.17"
+           y="-923.19"><tspan
+             x="200.17 206.286"
+             y="-923.19"
+             sodipodi:role="line"
+             id="tspan308">p3</tspan></text>
+        <path
+           d="m 197.75,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path312" />
+      </g>
+    </g>
+    <g
+       id="g314" />
+    <g
+       id="g316">
+      <g
+         id="g318"
+         clip-path="url(#clipPath322)">
+        <path
+           d="m 213.43,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path324" />
+        <path
+           d="m 213.43,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path326" />
+        <path
+           d="m 213.43,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path328" />
+        <path
+           d="m 214.14,761.33 0.21,-2.59 0.25,0.05 0.26,0.06 0.01,0.13 0.07,1.26 0.09,0.01 0.03,1.99 0.03,1.39 0.09,3.16 h 0.1 0.01 0.01 0.17 0.05 0.04 0.02 0.01 l 0.02,-0.51 0.03,0.51 0.03,-0.02 0.01,0.02 0.03,0.24 h 0.16 l 0.1,-0.21 0.01,-1.03 v 0 h 0.03 l 0.13,1.77 h 0.07 v 0 h 0.05 0.16 0.01 l 0.02,0.06 0.03,0.15 0.01,0.1 0.14,36.65 0.11,-37.36 h 0.14 0.02 0.01 v 0 h 0.02 l 0.22,0.2 0.2,-0.23 0.02,-0.09 0.46,-2.78 0.07,-0.33 h 0.05 l 0.08,2.41 0.03,0.17 0.08,-3.42 0.15,0.92 0.25,0.19 0.08,0.62 0.06,-0.08 0.07,-0.69 0.03,-0.27 h 0.01 l 0.08,4.92 0.34,-0.31 0.46,0.49 0.05,0.19 0.01,0.48 v 0 l 0.03,-0.59 0.07,0.64 0.05,-0.93 0.01,0.04 0.06,-0.46 0.02,2.31 0.03,0.46 0.06,-0.78 0.07,0.26 0.2,-0.5 v 0 h 0.01 0.01 l 0.01,4.82 v -9.1 l 0.02,-2.06 h 0.01 v 0 l 0.09,0.05 h 0.02 v 0 l 0.09,-1.59 0.07,-0.99 h 0.01 0.01 0.01 v 0 h 0.03 0.01 v 0 h 0.02 l 0.09,2.16 v 0 l 0.03,-1.42 h 0.05 0.13 0.07 0.02 l 0.08,0.03 h 0.01 0.01 0.01 0.01 l 0.03,1.68 0.02,-0.72 0.13,1.39 h 0.03 0.04 0.01 l 0.37,-0.69 0.09,-0.15 0.02,0.36 0.29,-1.01 0.15,-1.15 0.26,-2.41 0.05,-1.25 0.15,-0.16 0.09,0.01 0.26,0.36 v 0 h 0.05 l 0.06,0.07 0.19,0.25 0.12,0.16 v 0 l 0.08,0.47 h 0.01 v 0 l 0.01,0.82 h 0.01 l 0.04,0.07 0.01,0.04 v 0 0 h 0.04 0.01 0.05 v 0 l 0.11,3.41 v 0 0 h 0.05 0.01 0.01 v 0 h 0.01 v -1.91 l 0.08,0.79 0.08,-0.7 0.46,2.89 0.14,1.59 h 0.09 0.23 0.01 v 0 0 0 h 0.01 l 0.23,0.22 h 0.06 0.02 l 0.04,0.19 h 0.09 0.32 0.02 l 0.12,1.02 0.27,2.04 0.16,4.13 0.03,-0.39 0.46,-1.6 0.35,-1.68 0.11,3.09 0.47,2.71 0.02,-0.54 0.17,0.59 v 0 -0.02 l 0.08,-0.03 0.02,-0.01 0.11,1.81 0.02,-2.42"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path330" />
+        <path
+           d="m 213.43,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path332" />
+      </g>
+    </g>
+    <g
+       id="g334" />
+    <g
+       id="g336">
+      <g
+         id="g338"
+         clip-path="url(#clipPath342)">
+        <path
+           d="m 229.11,974.93 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path344" />
+        <path
+           d="m 229.11,949.64 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path346" />
+        <path
+           d="m 229.11,868.04 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path348" />
+        <path
+           d="m 229.82,758.84 0.14,0.68 h 0.03 l 0.19,1.06 h 0.01 l 0.03,-1.16 0.03,0.72 0.1,9.77 0.12,-7.32 0.04,3.3 0.03,0.02 0.1,-1.74 v -0.06 h 0.04 v 0 h 0.01 0.02 0.07 l 0.11,1.33 0.07,-2.21 0.01,0.03 0.15,0.41 0.07,-1.79 0.35,0.96 0.01,-0.05 0.44,-2 0.19,-1.41 0.01,-0.71 h 0.05 0.02 l 0.03,-0.71 0.13,0.83 0.09,0.81 0.02,0.46 0.33,-1.26 0.43,-0.8 v 0 h 0.12 0.06 l 0.26,0.17 0.19,0.15 h 0.07 l 0.06,1.55 v 0 l 0.03,0.03 0.01,-0.03 v 0 l 0.03,0.73 v 0 l 0.04,0.14 0.43,1.98 0.06,0.25 h 0.09 l 0.07,-4.17 0.22,2.02 0.01,0.17 0.41,-1.58 h 0.01 0.07 l 0.13,1.81 0.06,2.14 0.16,-2 0.02,-1.3 0.02,1.53 H 236 l 0.01,-2.94 0.11,1.11 v 0.39 l 0.21,-0.66 0.11,0.41 0.01,0.02 0.04,-0.66 0.01,-0.66 0.05,0.28 v 0 l 0.21,1.23 h 0.01 0.02 0.04 l 0.05,-0.02 0.01,0.05 v -0.03 h 0.02 l 0.04,-0.64 0.16,-1.66 0.04,0.08 0.05,0.76 v 0 l 0.43,7.07 0.12,2.76 0.28,-6.44 0.04,0.07 0.21,0.39 h 0.02 0.07 l 0.02,0.78 0.07,1.74 0.04,1.12 0.37,8.49 h 0.03 0.04 v 0 l 0.07,-3.62 0.16,2.88 v 0 l 0.09,-1.01 h 0.01 l 0.1,-0.66 0.43,-3.31 0.44,-3.51 0.04,-0.28 h 0.05 0.04 l 0.28,-0.14 0.02,-0.44 0.23,-4.41 0.01,-1.57 0.2,0.05 0.01,0.01 0.07,4.97 0.18,5.45 0.05,-5.8 v 0 0.01 l 0.09,1.17 0.03,-0.35 0.08,-0.83 h 0.03 l 0.31,5.2 0.02,0.37 0.24,8.4 0.03,-16.86 0.16,-0.79 0.43,-1.07 0.13,0.14 0.06,14.24 0.25,1.04 0.15,-0.27 0.01,-12.53 v 0 9.62 h 0.02 v 0 h 0.01 0.03 v 0 l 0.04,-0.04 0.01,0.04 h 0.04 v 0 l 0.12,-3.44 0.36,-6.96 v 0.25 -0.35"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path350" />
+        <path
+           d="m 229.11,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path352" />
+      </g>
+    </g>
+    <g
+       id="g354" />
+    <g
+       id="g356">
+      <g
+         id="g358"
+         clip-path="url(#clipPath362)">
+        <path
+           d="m 244.78,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path364" />
+        <path
+           d="m 244.78,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path366" />
+        <path
+           d="m 244.78,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path368" />
+        <path
+           d="m 245.49,761.17 v 0 h 0.03 l 0.03,-0.07 0.01,0.07 h 0.07 0.11 0.09 v 0 l 0.05,0.04 0.01,-0.04 h 0.01 0.02 v 0 0 h 0.01 0.03 0.07 0.02 v 0 l 0.02,1.45 h 0.01 v 0 h 0.01 v 0 0 h 0.16 0.17 0.05 0.06 l 0.13,-0.76 0.07,0.76 0.14,-2.56 0.01,0.17 0.16,3.05 v 3.3 l 0.01,-0.04 v 0 0 h 0.01 0.03 v 0 0 h 0.01 l 0.02,-0.52 h 0.01 v 0 0 h 0.01 l 0.01,3.4 v 0 l 0.04,3.09 0.06,-1.17 h 0.03 l 0.06,2.76 0.02,-8.07 0.36,-0.01 0.09,-1.37 0.14,-1.34 0.14,5.1 0.18,0.42 0.03,0.05 h 0.01 l 0.03,1.55 h 0.18 l 0.06,-3.09 0.15,1.6 0.14,0.59 0.15,-2.55 0.06,0.19 0.11,-0.45 0.08,-0.36 0.01,-0.11 v 0 0.01 l 0.03,-0.01 h 0.07 l 0.27,-6.58 0.01,-0.45 v 13.33 l 0.09,7.94 0.08,-17.15 h 0.06 0.13 l 0.03,1.18 0.05,-0.73 v 0.01 h 0.02 l 0.05,-0.01 0.11,-0.45 0.13,-1.86 0.14,-0.93 0.02,0.95 h 0.01 0.21 0.03 l 0.05,1.79 0.03,0.01 0.14,-0.46 0.44,0.29 0.02,0.62 0.23,-4.63 0.2,-1.2 0.04,0.07 0.2,2.83 v -0.07 l 0.1,6.68 0.11,0.93 0.01,0.31 h 0.03 l 0.01,0.5 0.03,5.6 v 0 l 0.25,4.03 0.06,-1.33 h 0.03 0.09 0.03 0.02 0.03 l 0.13,-1.18 0.25,-2.71 0.16,-1.52 h 0.02 l 0.22,2.15 0.03,-5.53 0.03,-0.11 0.42,-1.39 0.05,-0.13 0.02,-0.05 0.08,9.7 0.02,-0.29 0.06,1.79 0.02,1.6 0.07,0.21 v 0 l 0.19,7.22 0.34,5.18 0.12,-0.14 0.46,0.26 0.23,-1.27 0.04,-0.27 0.1,0.07 0.09,-0.07 0.11,-0.08 0.09,0.35 0.27,-1.02 0.16,-0.56 0.3,4.67 0.38,4.37 v 0 0 l 0.01,2.61 v 0 h 0.01 l 0.06,-0.03 0.1,-0.04 0.03,0.07 h 0.07 l 0.1,6.48 v 0 h 0.07 l 0.03,-11.44 0.06,-0.64 0.32,-3.86 h 0.09 0.06 0.36 l 0.1,-0.03 0.08,-0.03 0.01,-0.45 h 0.03 l 0.34,-9.75 0.05,-1.89 0.02,0.91 0.16,-1.65 0.07,-19.93 0.09,1.3"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path370" />
+        <path
+           d="m 244.78,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path372" />
+      </g>
+    </g>
+    <g
+       id="g374" />
+    <g
+       id="g376">
+      <g
+         id="g378"
+         clip-path="url(#clipPath382)">
+        <path
+           d="m 260.46,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path384" />
+        <path
+           d="m 260.46,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path386" />
+        <path
+           d="m 260.46,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path388" />
+        <path
+           d="m 261.17,776.68 v -0.08 l 0.37,-1.73 0.08,-0.15 0.06,6.89 0.22,-0.83 0.06,12.02 0.14,-4.88 0.07,1.18 h 0.02 v 0 l 0.39,-2.6 h 0.03 v 0 h 0.04 v 0 0 0 0 0 0 h 0.01 v 0 0 h 0.01 v 0 0 h 0.02 v 0 h 0.05 v 0 h 0.01 v 0 h 0.02 0.03 v 1.45 0 l 0.09,-10.96 0.07,1.6 0.02,1.12 h 0.05 0.08 0.06 0.03 v 0.09 l 0.1,3.66 h 0.06 l 0.35,-6.85 0.04,-2.07 0.08,7.37 0.16,-3.09 0.01,-6.25 h 0.15 0.01 0.06 v 0 h 0.01 0.02 0.11 0.03 v 0 0 h 0.02 0.08 l 0.06,-0.39 0.13,0.03 0.03,0.84 0.01,-0.02 0.05,-0.09 0.09,-9.92 0.09,4.28 0.03,-1.81 0.04,5.01 0.18,-0.16 h 0.01 l 0.02,0.62 0.06,1.54 0.15,-7.8 h 0.04 l 0.09,3.11 v 0 h 0.02 0.15 0.12 l 0.12,2.39 0.14,0.71 0.13,-0.21 0.14,-4.88 0.36,3.01 0.02,-0.2 0.3,1.44 0.11,-1.39 h 0.06 0.01 0.01 v 0.02 l 0.51,0.41 0.38,-0.84 0.02,0.97 0.11,-0.77 0.51,-4.74 0.08,-0.78 v -0.56 -0.1 l 0.06,-0.05 0.36,-0.25 0.05,-0.08 h 0.03 v 0 l 0.43,-1.99 0.23,-0.63 0.12,0.85 0.07,-0.15 0.08,-0.39 v 0 l 0.01,-0.01 v 0 l 0.02,0.01 0.41,-1.67 v 1.31 h 0.08 0.01 0.04 l 0.09,1.64 h 0.03 l 0.09,1.13 0.02,0.12 0.01,-1.87 0.21,-1.74 0.06,-0.49 v 2.43 l 0.02,0.01 0.43,3.4 0.32,3.81 0.19,-0.75 0.05,-0.18 h 0.04 v 0 h 0.01 l 0.09,-5.97 h 0.01 v 0 0 h 0.02 v 0 h 0.05 0.01 0.03 0.01 0.02 v 0 h 0.02 l 0.08,-0.21 h 0.03 0.03 0.01 0.01 v 0 h 0.05 0.01 v 0 l 0.02,0.05 0.01,-0.07 0.07,0.02 h 0.01 0.01 0.05 0.02 l 0.24,1.69 0.04,0.28 h 0.04 0.04 0.01 l 0.03,-0.37 v 0 h 0.07 l 0.01,0.03 0.08,-0.03 0.19,-0.23 0.1,-0.09 h 0.02 v 0 h 0.04 l 0.02,-0.13 h 0.01 0.07 l 0.25,3.87 0.01,0.11 h 0.03 l 0.18,1.88 h 0.19 0.06 l 0.04,-0.2 0.06,-0.3 0.01,-0.95 h 0.03 0.03 0.06 0.1 l 0.13,4.58 0.08,-9.98 0.04,2.82"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path390" />
+        <path
+           d="m 260.46,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path392" />
+      </g>
+    </g>
+    <g
+       id="g394" />
+    <g
+       id="g396">
+      <g
+         id="g398"
+         clip-path="url(#clipPath402)">
+        <path
+           d="m 276.14,974.93 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path404" />
+        <path
+           d="m 276.14,949.64 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path406" />
+        <path
+           d="m 276.14,868.04 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path408" />
+        <path
+           d="m 276.85,765.67 0.13,-0.76 0.1,0.85 h 0.01 l 0.31,-3.72 v 0.25 l 0.12,6.89 0.05,5.01 h 0.12 l 0.27,2.38 0.2,0.59 0.19,-5.71 0.16,-0.7 0.31,-2.17 0.11,-7.55 0.13,1.7 0.22,7.64 0.25,-10.37 0.09,0.04 0.55,0.57 0.55,0.81 0.25,0.48 0.31,-0.34 0.3,-0.04 0.1,0.77 h 0.09 l 0.06,0.13 0.16,0.35 v 0 0 0 0 h 0.05 v 0 0 l 0.02,0.01 h 0.01 v 0 0 l 0.01,-0.01 v 0 h 0.02 l 0.03,1.65 0.25,1.38 0.48,4.27 h 0.02 v 0 h 0.01 v 0 h 0.01 l 0.01,0.06 0.01,-0.06 h 0.02 0.04 v 0.06 l 0.23,5.77 0.04,-2.43 0.24,-2.46 0.07,-0.82 h 0.02 v 0.02 l 0.16,0.86 h 0.02 v 0 h 0.07 0.01 l 0.03,3.84 0.07,-0.01 v -8.12 l 0.07,-0.09 0.03,-0.19 0.26,1.09 0.06,-0.57 h 0.12 0.09 0.02 0.01 0.01 0.02 0.01 0.08 l 0.14,-2.8 0.1,4.68 0.19,-6.86 0.13,0.88 0.18,-3 0.1,6.91 h 0.02 0.02 v 0 0 l 0.01,0.76 0.01,1.27 v 0 l 0.01,1.37 h 0.07 0.04 l 0.03,-0.1 0.29,2.39 0.15,-5.66 h 0.03 0.02 0.08 l 0.27,1.79 0.1,-1.26 0.1,-1.78 0.45,-6.49 h 0.02 l 0.05,-0.2 0.03,0.07 0.09,0.13 h 0.12 0.07 l 0.22,-0.08 0.02,0.01 0.04,0.08 0.14,0.61 h 0.07 l 0.27,1.51 0.01,0.45 0.06,0.46 0.18,1.73 h 0.05 0.05 0.04 0.05 l 0.18,-2.2 0.08,-3.35 0.48,0.16 0.55,0.32 0.24,0.2 0.31,0.26 0.42,0.46"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path410" />
+        <path
+           d="m 276.14,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path412" />
+      </g>
+    </g>
+    <g
+       id="g414" />
+    <g
+       id="g416">
+      <g
+         id="g418"
+         clip-path="url(#clipPath422)">
+        <path
+           d="m 291.81,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path424" />
+        <path
+           d="m 291.81,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path426" />
+        <path
+           d="m 291.81,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path428" />
+        <path
+           d="m 292.53,762.55 h 0.04 l 0.05,-3.67 0.1,3.91 0.07,-1.96 0.12,2.63 0.1,-1.66 0.21,-2.75 0.28,1.32 0.4,5.23 0.02,-4.51 0.05,-0.05 v 0.52 l 0.01,0.11 0.06,0.4 0.09,-2.49 0.05,0.15 0.04,0.09 0.05,-0.16 0.06,-0.27 0.04,-0.24 v 0 h 0.01 l 0.05,0.09 0.04,-0.08 v -0.01 h 0.01 l 0.02,0.03 h 0.02 l 0.07,0.59 0.01,-0.05 0.03,-0.11 0.1,-0.15 0.09,-0.2 0.02,-0.04 0.02,-0.04 h 0.1 0.04 l 0.05,0.55 0.01,18.03 0.01,-1.44 0.01,-0.23 0.07,-16.93 0.07,0.33 0.16,-1.02 0.02,-0.27 0.04,0.28 0.36,7 0.07,21.36 0.06,-9.12 0.47,-13.73 0.01,-0.2 0.26,-3.06 h 0.02 0.01 0.03 l 0.01,0.7 0.02,0.12 0.03,-0.29 h 0.01 v 0 h 0.01 v 0 h 0.01 0.02 l 0.06,0.27 0.32,1.47 h 0.1 0.06 0.18 0.04 l 0.01,-0.01 V 763 l 0.26,-0.25 0.21,1.22 h 0.01 l 0.17,0.07 0.1,0.15 v 0 l 0.03,0.4 0.13,0.17 0.19,0.17 h 0.03 l 0.1,0.98 0.01,0.05 0.07,-1.03 0.14,0.69 0.2,0.96 0.07,6.88 0.02,3.15 0.07,-4.49 0.39,-5.41 0.16,-1.15 0.33,4.27 0.32,4.2 0.17,-3.99 0.48,-9.7 0.01,-0.1 h 0.07 l 0.12,1.43 0.06,3.08 0.03,-0.44 0.17,0.44 0.03,0.12 0.17,-0.07 h 0.03 0.03 0.11 0.02 0.07 v 0 h 0.05 0.49 0.01 0.16 l 0.04,0.03 0.01,-0.03 0.05,3.56 v 0 h 0.02 l 0.11,0.25 v -0.25 l 0.09,-0.39 0.1,-0.36 h 0.02 0.01 v 0 l 0.02,0.33 0.06,-0.21 0.13,0.77 0.14,-1.06 v 0.03 l 0.09,-4.52 0.01,0.03 h 0.01 v 0 l 0.01,-0.02 0.07,0.46 0.07,-0.61 h 0.15 0.08 v 0 h 0.02 l 0.23,0.01 h 0.01 l 0.13,0.32 0.09,1 v 0.05 l 0.14,1.7 0.35,-3.99 0.21,-1.85 0.08,1.2 v 0 h 0.03 l 0.17,-0.62 v -0.03 h 0.05 l 0.17,-0.25 0.03,0.21 0.09,-1.52 0.1,4.66 0.04,-0.75 0.03,-0.16 0.21,-3.06 0.2,0.44 v -0.86 l 0.05,1.16 0.09,2.13 h 0.03 0.02 v 0.03 0 l 0.01,0.32 v 0 0.16 l 0.01,0.81"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path430" />
+        <path
+           d="m 291.81,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path432" />
+      </g>
+    </g>
+    <g
+       id="g434" />
+    <g
+       id="g436">
+      <g
+         id="g438"
+         clip-path="url(#clipPath442)">
+        <path
+           d="m 307.49,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path444" />
+        <path
+           d="m 307.49,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path446" />
+        <path
+           d="m 307.49,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path448" />
+        <path
+           d="m 308.2,767.88 0.26,-7.07 0.07,0.18 h 0.02 l 0.07,0.28 0.09,-0.26 v -0.02 h 0.02 v 0 0 0 h 0.01 v 0 -0.01 h 0.01 l 0.03,0.01 0.01,-1.14 0.02,0.01 v -0.01 h 0.01 0.05 0.05 l 0.02,-0.04 0.03,0.04 h 0.02 l 0.06,-0.22 h 0.03 v 0 h 0.04 v 0 h 0.04 0.02 0.03 0.01 v 0 l 0.02,1.16 0.09,-0.4 0.05,1.56 0.02,0.29 0.13,0.07 h 0.02 l 0.01,-0.08 0.04,-0.2 0.01,-0.04 0.01,-0.03 0.06,0.11 0.02,0.03 0.01,-0.06 0.1,-0.68 0.19,-0.3 v 0 h 0.1 0.01 0.01 0.01 0.05 l 0.03,0.74 v 0 0 -0.01 l 0.06,-0.26 0.02,0.08 0.04,-0.13 0.06,0.32 v 0 l 0.22,1.55 h 0.01 0.02 l 0.08,-0.1 0.46,-0.74 v 0 h 0.04 0.06 v 0 h 0.07 0.08 v 0 l 0.29,-1.94 0.2,-1.29 0.02,0.24 0.12,-0.09 h 0.01 0.02 l 0.01,0.02 0.01,0.05 0.02,-0.05 0.01,-0.07 0.04,-0.41 h 0.03 0.02 0.01 l 0.21,-0.05 0.05,-0.23 v 0 l 0.02,-0.04 0.11,0.32 h 0.01 0.01 l 0.08,0.23 0.2,2.87 h 0.06 l 0.18,-0.67 0.06,-0.03 0.12,-0.03 0.07,0.14 h 0.03 0.01 l 0.07,0.6 0.06,-0.07 0.02,0.19 h 0.07 0.05 0.01 v 0 h 0.05 0.06 0.02 l 0.01,2.69 h 0.01 0.02 v 0 h 0.01 0.04 0.01 0.01 l 0.26,4.61 0.01,0.26 0.18,-0.45 h 0.01 v 0 l 0.14,0.58 h 0.03 l 0.1,2.96 h 0.03 0.15 l 0.14,-2.53 0.2,-2.53 h 0.01 0.07 l 0.32,6.57 0.12,-0.86 0.36,-3.23 0.14,-0.51 v 0 0 h 0.11 l 0.07,-0.01 0.14,4.36 0.18,6.79 0.14,4.15 h 0.05 v 0 l 0.32,11.24 0.12,3.78 0.01,0.05 h 0.2 0.05 l 0.04,-14.42 0.08,5.33 0.16,1.41 0.34,0.24 0.05,0.15 0.16,-0.02 0.29,12.66 0.02,0.47 v 0 l 0.2,-16.3 h 0.27 l 0.02,-0.08 0.5,-3.61 0.49,-4.31 0.01,-0.19 0.11,-2.64 h 0.04 0.01 0.01 l 0.3,-1.15 0.04,-3.48 0.04,-5.08 0.13,-0.82 0.33,-1.12 0.5,-1.96 0.24,-1 h 0.04 l 0.04,-0.65 0.07,0.15 0.07,2.91 0.04,-0.23 0.12,-0.64 0.01,0.06 h 0.04"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path450" />
+        <path
+           d="m 307.49,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path452" />
+      </g>
+    </g>
+    <g
+       id="g454" />
+    <g
+       id="g456">
+      <g
+         id="g458"
+         clip-path="url(#clipPath462)">
+        <path
+           d="m 323.17,974.93 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path464" />
+        <path
+           d="m 323.17,949.64 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path466" />
+        <path
+           d="m 323.17,868.04 h 15.67"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path468" />
+        <path
+           d="m 323.88,759.54 0.54,-0.16 0.01,-0.01 0.52,-0.07 0.54,-0.07 0.11,-0.01 0.42,1.88 0.23,0.65 0.14,0.56 h 0.01 l 0.01,-0.68 0.07,-0.12 0.02,0.8 h 0.02 v 0 l 0.04,-0.25 v 0.04 l 0.05,2.64 0.1,-1.71 0.08,-3.73 0.31,0.53 0.48,-0.09 h 0.04 l 0.01,0.05 0.35,1.09 0.19,-0.07 0.19,-0.8 0.11,1.61 0.03,1.01 h 0.01 0.01 0.05 0.04 v 0 l 0.08,-0.42 h 0.01 l 0.01,0.01 0.2,0.57 0.03,-0.06 h 0.05 0.04 v 0 h 0.04 l 0.17,-1.86 0.01,-0.03 0.04,0.8 h 0.09 v 0 h 0.15 l 0.04,0.3 0.09,0.77 0.12,0.07 0.02,0.02 h 0.04 v 0 h 0.12 l 0.14,-1.34 0.22,-0.72 v -0.01 l 0.53,-2.21 0.02,-0.08 0.24,3.91 0.28,1.21 0.18,1.75 v 0 h 0.01 0.03 0.01 0.04 0.01 v 0 0 h 0.01 v 0 0 0 0 0 h 0.01 v 0 h 0.01 l 0.01,-0.11 0.04,0.11 v 0 h 0.03 0.01 0.02 0.03 0.02 0.01 0.01 0.01 l 0.04,-0.11 0.06,-0.03 0.05,-0.64 0.08,1.3 0.02,-0.02 0.05,0.25 v 0 0 0 0 0 0 0 0 0 1.16 l 0.01,-1.4 0.02,-0.04 0.01,2.44 0.19,0.07 v 0 h 0.04 0.03 l 0.13,1.74 h 0.01 l 0.07,-0.01 0.01,0.01 h 0.01 0.01 v 0 h 0.08 0.01 0.01 v 0 h 0.01 v 0 h 0.01 0.03 0.12 0.17 0.03 l 0.01,-2.43 h 0.01 v 0 0 l 0.01,0.06 0.06,-0.06 h 0.01 0.01 0.01 0.04 0.01 0.01 0.02 v 0 l 0.02,-0.02 v 0 -0.01 l 0.02,-1.76 0.01,3.01 0.04,0.09 v 0 h 0.04 v 0 h 0.05 l 0.16,-4.21 0.11,0.39 h 0.02 v 0 h 0.02 0.02 0.02 l 0.02,9.25 v 0 h 0.02 v 0 h 0.01 l 0.01,0.85 h 0.04 0.03 v 0 0 h 0.01 0.01 0.01 l 0.12,-0.57 h 0.02 0.08 l 0.3,-0.9 0.44,-1.46 h 0.03 0.02 0.01 v 0 h 0.03 0.17 l 0.25,-2.68 v 0 h 0.04 0.01 v 0 l 0.07,-0.1 0.03,-0.04 0.18,-1.56 0.19,0.68 0.14,-0.25 0.09,-0.13 h 0.01 0.05 v 0 h 0.37 0.01 0.01 v 0 l 0.03,9.35 0.03,1.46 h 0.05 v 0 l 0.03,-3.96 0.05,1.17 0.02,-3.17 h 0.01 v 0 0 h 0.01 v 0 0 h 0.02 0.28 v -0.34 l 0.01,-1 v 0 l 0.02,1.34 0.01,-0.06 0.22,-9.58 0.1,-1.89 0.18,1.02 0.27,1.87 0.03,54.49"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path470" />
+        <path
+           d="m 323.17,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path472" />
+      </g>
+    </g>
+    <g
+       id="g474" />
+    <g
+       id="g476">
+      <g
+         id="g478"
+         clip-path="url(#clipPath482)">
+        <path
+           d="m 338.84,974.93 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path484" />
+        <path
+           d="m 338.84,949.64 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path486" />
+        <path
+           d="m 338.84,868.04 h 15.68"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path488" />
+        <path
+           d="m 339.56,777.81 0.05,2.42 0.2,-4.51 0.09,1.91 0.03,-3.28 v 0 h 0.02 v 0.05 0 l 0.23,-0.68 0.11,-1.29 0.01,-0.29 0.18,-3 0.19,1.21 0.38,1.94 0.01,-0.27 0.36,0.28 0.22,0.09 0.15,-0.68 0.37,-1.02 0.38,-1.16 0.34,-1.16 0.03,-0.73 0.25,-6.83 0.12,-0.1 0.08,-0.05 h 0.11 l 0.01,-0.15 0.13,12.21 0.04,-0.31 0.05,-0.31 0.08,-9.42 h 0.01 0.01 l 0.06,0.36 0.02,-1.23 v 0 l 0.04,-0.28 h 0.11 0.05 l 0.15,0.12 0.12,-0.06 v 0 h 0.05 l 0.09,-0.01 0.01,0.01 0.04,1.22 v 0 h 0.01 v 0 l 0.22,-3.65 0.21,-1.23 h 0.04 0.07 v 0 h 0.01 0.02 0.01 0.01 0.02 0.11 l 0.07,2.41 0.17,0.92 0.01,0.41 0.02,2.75 0.11,-6.48 h 0.02 0.01 0.01 0.02 0.02 0.07 l 0.09,0.18 0.11,0.68 v 0 0 l 0.11,-0.41 v -0.01 l 0.07,1.61 v 0.23 h 0.02 0.01 v 0 h 0.01 l 0.04,0.03 0.11,-0.01 h 0.05 l 0.03,0.03 0.05,-0.08 0.02,-0.02 0.1,0.57 0.01,-0.5 0.05,-1.22 v 0 0 l 0.06,-0.14 0.27,0.09 0.21,0.37 0.16,-0.09 0.1,0.32 0.22,1.81 0.05,-0.08 0.13,-0.19 0.04,0.46 0.03,0.03 h 0.02 l 0.01,-0.03 0.07,-0.28 0.07,0.21 0.11,0.37 0.07,0.36 v 0 l 0.01,-1.33 v 3.26 1.09 l 0.01,-3.15 h 0.01 l 0.01,7.47 0.01,-0.71 v -0.01 l 0.15,-5.17 0.01,-0.43 0.31,0.07 0.05,-0.47 0.09,-0.48 h 0.08 v 0 h 0.02 v 0 h 0.18 0.06 0.03 0.05 l 0.09,0.74 h 0.01 l 0.07,1.55 0.06,2.01 0.04,1.17 0.08,-2 0.03,-0.42 v 0 h 0.02 l 0.03,0.33 0.18,3.68 0.33,16.59 0.04,-2.96 0.09,2.99 0.05,-21.06 0.04,0.27 0.03,-0.81 0.16,2.88 0.14,2.69 h 0.12 0.01 l 0.1,0.36 0.38,1.79 0.37,-4.97 0.07,0.38 0.08,-0.96 0.12,10.12 h 0.06 l 0.01,0.07 0.03,-0.05 v 0 l 0.07,-0.07 0.02,-2.56 0.12,-8.59 0.16,-0.75 0.01,-0.04 0.08,0.12 0.29,1.01 0.27,0.84 v 0.72 l 0.04,-0.03 0.03,-0.88 0.03,-0.72 0.01,-0.19 h 0.14 l 0.18,1.05 0.04,-0.84 0.04,-0.78 h 0.06"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path490" />
+        <path
+           d="m 338.84,746.9 h 15.68 v 238.89 h -15.68 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path492" />
+      </g>
+    </g>
+    <g
+       id="g494" />
+    <g
+       id="g496">
+      <g
+         id="g498"
+         clip-path="url(#clipPath502)" />
+    </g>
+    <g
+       id="g504">
+      <g
+         id="g506"
+         clip-path="url(#clipPath510)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,45.49,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text514"><tspan
+             x="0"
+             y="0"
+             id="tspan512">1</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g516">
+      <g
+         id="g518"
+         clip-path="url(#clipPath522)" />
+    </g>
+    <g
+       id="g524">
+      <g
+         id="g526"
+         clip-path="url(#clipPath530)" />
+    </g>
+    <g
+       id="g532" />
+    <g
+       id="g534">
+      <g
+         id="g536"
+         clip-path="url(#clipPath540)" />
+    </g>
+    <g
+       id="g542">
+      <g
+         id="g544"
+         clip-path="url(#clipPath548)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,61.16,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text552"><tspan
+             x="0"
+             y="0"
+             id="tspan550">2</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g554">
+      <g
+         id="g556"
+         clip-path="url(#clipPath560)" />
+    </g>
+    <g
+       id="g562">
+      <g
+         id="g564"
+         clip-path="url(#clipPath568)" />
+    </g>
+    <g
+       id="g570" />
+    <g
+       id="g572">
+      <g
+         id="g574"
+         clip-path="url(#clipPath578)" />
+    </g>
+    <g
+       id="g580">
+      <g
+         id="g582"
+         clip-path="url(#clipPath586)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,76.84,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text590"><tspan
+             x="0"
+             y="0"
+             id="tspan588">3</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g592">
+      <g
+         id="g594"
+         clip-path="url(#clipPath598)" />
+    </g>
+    <g
+       id="g600">
+      <g
+         id="g602"
+         clip-path="url(#clipPath606)" />
+    </g>
+    <g
+       id="g608" />
+    <g
+       id="g610">
+      <g
+         id="g612"
+         clip-path="url(#clipPath616)" />
+    </g>
+    <g
+       id="g618">
+      <g
+         id="g620"
+         clip-path="url(#clipPath624)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,92.52,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text628"><tspan
+             x="0"
+             y="0"
+             id="tspan626">4</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g630">
+      <g
+         id="g632"
+         clip-path="url(#clipPath636)" />
+    </g>
+    <g
+       id="g638">
+      <g
+         id="g640"
+         clip-path="url(#clipPath644)" />
+    </g>
+    <g
+       id="g646" />
+    <g
+       id="g648">
+      <g
+         id="g650"
+         clip-path="url(#clipPath654)" />
+    </g>
+    <g
+       id="g656">
+      <g
+         id="g658"
+         clip-path="url(#clipPath662)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,108.19,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text666"><tspan
+             x="0"
+             y="0"
+             id="tspan664">5</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g668">
+      <g
+         id="g670"
+         clip-path="url(#clipPath674)" />
+    </g>
+    <g
+       id="g676">
+      <g
+         id="g678"
+         clip-path="url(#clipPath682)" />
+    </g>
+    <g
+       id="g684" />
+    <g
+       id="g686">
+      <g
+         id="g688"
+         clip-path="url(#clipPath692)" />
+    </g>
+    <g
+       id="g694">
+      <g
+         id="g696"
+         clip-path="url(#clipPath700)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,123.87,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text704"><tspan
+             x="0"
+             y="0"
+             id="tspan702">6</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g706">
+      <g
+         id="g708"
+         clip-path="url(#clipPath712)" />
+    </g>
+    <g
+       id="g714">
+      <g
+         id="g716"
+         clip-path="url(#clipPath720)" />
+    </g>
+    <g
+       id="g722" />
+    <g
+       id="g724">
+      <g
+         id="g726"
+         clip-path="url(#clipPath730)" />
+    </g>
+    <g
+       id="g732">
+      <g
+         id="g734"
+         clip-path="url(#clipPath738)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,139.55,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text742"><tspan
+             x="0"
+             y="0"
+             id="tspan740">7</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g744">
+      <g
+         id="g746"
+         clip-path="url(#clipPath750)" />
+    </g>
+    <g
+       id="g752">
+      <g
+         id="g754"
+         clip-path="url(#clipPath758)" />
+    </g>
+    <g
+       id="g760" />
+    <g
+       id="g762">
+      <g
+         id="g764"
+         clip-path="url(#clipPath768)" />
+    </g>
+    <g
+       id="g770">
+      <g
+         id="g772"
+         clip-path="url(#clipPath776)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,155.22,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text780"><tspan
+             x="0"
+             y="0"
+             id="tspan778">8</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g782">
+      <g
+         id="g784"
+         clip-path="url(#clipPath788)" />
+    </g>
+    <g
+       id="g790">
+      <g
+         id="g792"
+         clip-path="url(#clipPath796)" />
+    </g>
+    <g
+       id="g798" />
+    <g
+       id="g800">
+      <g
+         id="g802"
+         clip-path="url(#clipPath806)" />
+    </g>
+    <g
+       id="g808">
+      <g
+         id="g810"
+         clip-path="url(#clipPath814)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,170.9,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text818"><tspan
+             x="0"
+             y="0"
+             id="tspan816">9</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g820">
+      <g
+         id="g822"
+         clip-path="url(#clipPath826)" />
+    </g>
+    <g
+       id="g828">
+      <g
+         id="g830"
+         clip-path="url(#clipPath834)" />
+    </g>
+    <g
+       id="g836" />
+    <g
+       id="g838">
+      <g
+         id="g840"
+         clip-path="url(#clipPath844)" />
+    </g>
+    <g
+       id="g846">
+      <g
+         id="g848"
+         clip-path="url(#clipPath852)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,183.24,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text856"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan854">10</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g858">
+      <g
+         id="g860"
+         clip-path="url(#clipPath864)" />
+    </g>
+    <g
+       id="g866">
+      <g
+         id="g868"
+         clip-path="url(#clipPath872)" />
+    </g>
+    <g
+       id="g874" />
+    <g
+       id="g876">
+      <g
+         id="g878"
+         clip-path="url(#clipPath882)" />
+    </g>
+    <g
+       id="g884">
+      <g
+         id="g886"
+         clip-path="url(#clipPath890)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,198.92,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text894"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan892">11</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g896">
+      <g
+         id="g898"
+         clip-path="url(#clipPath902)" />
+    </g>
+    <g
+       id="g904">
+      <g
+         id="g906"
+         clip-path="url(#clipPath910)" />
+    </g>
+    <g
+       id="g912" />
+    <g
+       id="g914">
+      <g
+         id="g916"
+         clip-path="url(#clipPath920)" />
+    </g>
+    <g
+       id="g922">
+      <g
+         id="g924"
+         clip-path="url(#clipPath928)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,214.59,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text932"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan930">12</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g934">
+      <g
+         id="g936"
+         clip-path="url(#clipPath940)" />
+    </g>
+    <g
+       id="g942">
+      <g
+         id="g944"
+         clip-path="url(#clipPath948)" />
+    </g>
+    <g
+       id="g950" />
+    <g
+       id="g952">
+      <g
+         id="g954"
+         clip-path="url(#clipPath958)" />
+    </g>
+    <g
+       id="g960">
+      <g
+         id="g962"
+         clip-path="url(#clipPath966)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,230.27,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text970"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan968">13</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g972">
+      <g
+         id="g974"
+         clip-path="url(#clipPath978)" />
+    </g>
+    <g
+       id="g980">
+      <g
+         id="g982"
+         clip-path="url(#clipPath986)" />
+    </g>
+    <g
+       id="g988" />
+    <g
+       id="g990">
+      <g
+         id="g992"
+         clip-path="url(#clipPath996)" />
+    </g>
+    <g
+       id="g998">
+      <g
+         id="g1000"
+         clip-path="url(#clipPath1004)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,245.95,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text1008"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan1006">14</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g1010">
+      <g
+         id="g1012"
+         clip-path="url(#clipPath1016)" />
+    </g>
+    <g
+       id="g1018">
+      <g
+         id="g1020"
+         clip-path="url(#clipPath1024)" />
+    </g>
+    <g
+       id="g1026" />
+    <g
+       id="g1028">
+      <g
+         id="g1030"
+         clip-path="url(#clipPath1034)" />
+    </g>
+    <g
+       id="g1036">
+      <g
+         id="g1038"
+         clip-path="url(#clipPath1042)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,261.63,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text1046"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan1044">15</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g1048">
+      <g
+         id="g1050"
+         clip-path="url(#clipPath1054)" />
+    </g>
+    <g
+       id="g1056">
+      <g
+         id="g1058"
+         clip-path="url(#clipPath1062)" />
+    </g>
+    <g
+       id="g1064" />
+    <g
+       id="g1066">
+      <g
+         id="g1068"
+         clip-path="url(#clipPath1072)" />
+    </g>
+    <g
+       id="g1074">
+      <g
+         id="g1076"
+         clip-path="url(#clipPath1080)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,277.3,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text1084"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan1082">16</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g1086">
+      <g
+         id="g1088"
+         clip-path="url(#clipPath1092)" />
+    </g>
+    <g
+       id="g1094">
+      <g
+         id="g1096"
+         clip-path="url(#clipPath1100)" />
+    </g>
+    <g
+       id="g1102" />
+    <g
+       id="g1104">
+      <g
+         id="g1106"
+         clip-path="url(#clipPath1110)" />
+    </g>
+    <g
+       id="g1112">
+      <g
+         id="g1114"
+         clip-path="url(#clipPath1118)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,292.98,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text1122"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan1120">17</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g1124">
+      <g
+         id="g1126"
+         clip-path="url(#clipPath1130)" />
+    </g>
+    <g
+       id="g1132">
+      <g
+         id="g1134"
+         clip-path="url(#clipPath1138)" />
+    </g>
+    <g
+       id="g1140" />
+    <g
+       id="g1142">
+      <g
+         id="g1144"
+         clip-path="url(#clipPath1148)" />
+    </g>
+    <g
+       id="g1150">
+      <g
+         id="g1152"
+         clip-path="url(#clipPath1156)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,308.66,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text1160"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan1158">18</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g1162">
+      <g
+         id="g1164"
+         clip-path="url(#clipPath1168)" />
+    </g>
+    <g
+       id="g1170">
+      <g
+         id="g1172"
+         clip-path="url(#clipPath1176)" />
+    </g>
+    <g
+       id="g1178" />
+    <g
+       id="g1180">
+      <g
+         id="g1182"
+         clip-path="url(#clipPath1186)" />
+    </g>
+    <g
+       id="g1188">
+      <g
+         id="g1190"
+         clip-path="url(#clipPath1194)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,324.33,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text1198"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan1196">19</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g1200">
+      <g
+         id="g1202"
+         clip-path="url(#clipPath1206)" />
+    </g>
+    <g
+       id="g1208">
+      <g
+         id="g1210"
+         clip-path="url(#clipPath1214)" />
+    </g>
+    <g
+       id="g1216" />
+    <g
+       id="g1218">
+      <g
+         id="g1220"
+         clip-path="url(#clipPath1224)" />
+    </g>
+    <g
+       id="g1226">
+      <g
+         id="g1228"
+         clip-path="url(#clipPath1232)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,342.68,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text1236"><tspan
+             x="0"
+             y="0"
+             id="tspan1234">X</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g1238">
+      <g
+         id="g1240"
+         clip-path="url(#clipPath1244)" />
+    </g>
+    <g
+       id="g1246">
+      <g
+         id="g1248"
+         clip-path="url(#clipPath1252)" />
+    </g>
+    <g
+       id="g1254" />
+    <g
+       id="g1256" />
+    <g
+       id="g1258" />
+    <g
+       id="g1260" />
+    <g
+       id="g1262" />
+    <g
+       id="g1264" />
+    <g
+       id="g1266" />
+    <g
+       id="g1268" />
+    <g
+       id="g1270" />
+    <g
+       id="g1272" />
+    <g
+       id="g1274" />
+    <g
+       id="g1276" />
+    <g
+       id="g1278" />
+    <g
+       id="g1280" />
+    <g
+       id="g1282" />
+    <g
+       id="g1284" />
+    <g
+       id="g1286" />
+    <g
+       id="g1288" />
+    <g
+       id="g1290" />
+    <g
+       id="g1292" />
+    <g
+       id="g1294" />
+    <g
+       id="g1296" />
+    <g
+       id="g1298" />
+    <g
+       id="g1300" />
+    <g
+       id="g1302" />
+    <g
+       id="g1304" />
+    <g
+       id="g1306" />
+    <g
+       id="g1308" />
+    <g
+       id="g1310" />
+    <g
+       id="g1312" />
+    <g
+       id="g1314" />
+    <g
+       id="g1316" />
+    <g
+       id="g1318" />
+    <g
+       id="g1320" />
+    <g
+       id="g1322" />
+    <g
+       id="g1324" />
+    <g
+       id="g1326" />
+    <g
+       id="g1328" />
+    <g
+       id="g1330" />
+    <g
+       id="g1332" />
+    <g
+       id="g1334" />
+    <g
+       id="g1336" />
+    <g
+       id="g1338" />
+    <g
+       id="g1340" />
+    <g
+       id="g1342" />
+    <g
+       id="g1344" />
+    <g
+       id="g1346" />
+    <g
+       id="g1348" />
+    <g
+       id="g1350" />
+    <g
+       id="g1352" />
+    <g
+       id="g1354" />
+    <g
+       id="g1356" />
+    <g
+       id="g1358" />
+    <g
+       id="g1360" />
+    <g
+       id="g1362" />
+    <g
+       id="g1364" />
+    <g
+       id="g1366" />
+    <g
+       id="g1368" />
+    <g
+       id="g1370" />
+    <g
+       id="g1372" />
+    <g
+       id="g1374" />
+    <g
+       id="g1376" />
+    <g
+       id="g1378" />
+    <g
+       id="g1380" />
+    <g
+       id="g1382" />
+    <g
+       id="g1384" />
+    <g
+       id="g1386" />
+    <g
+       id="g1388" />
+    <g
+       id="g1390" />
+    <g
+       id="g1392" />
+    <g
+       id="g1394" />
+    <g
+       id="g1396" />
+    <g
+       id="g1398" />
+    <g
+       id="g1400" />
+    <g
+       id="g1402" />
+    <g
+       id="g1404" />
+    <g
+       id="g1406" />
+    <g
+       id="g1408" />
+    <g
+       id="g1410" />
+    <g
+       id="g1412" />
+    <g
+       id="g1414" />
+    <g
+       id="g1416" />
+    <g
+       id="g1418" />
+    <g
+       id="g1420" />
+    <g
+       id="g1422" />
+    <g
+       id="g1424" />
+    <g
+       id="g1426" />
+    <g
+       id="g1428" />
+    <g
+       id="g1430" />
+    <g
+       id="g1432" />
+    <g
+       id="g1434" />
+    <g
+       id="g1436" />
+    <g
+       id="g1438" />
+    <g
+       id="g1440" />
+    <g
+       id="g1442" />
+    <g
+       id="g1444" />
+    <g
+       id="g1446" />
+    <g
+       id="g1448" />
+    <g
+       id="g1450" />
+    <g
+       id="g1452" />
+    <g
+       id="g1454" />
+    <g
+       id="g1456" />
+    <g
+       id="g1458" />
+    <g
+       id="g1460" />
+    <g
+       id="g1462" />
+    <g
+       id="g1464" />
+    <g
+       id="g1466" />
+    <g
+       id="g1468" />
+    <g
+       id="g1470" />
+    <g
+       id="g1472" />
+    <g
+       id="g1474" />
+    <g
+       id="g1476" />
+    <g
+       id="g1478" />
+    <g
+       id="g1480" />
+    <g
+       id="g1482" />
+    <g
+       id="g1484" />
+    <g
+       id="g1486" />
+    <g
+       id="g1488" />
+    <g
+       id="g1490" />
+    <g
+       id="g1492" />
+    <g
+       id="g1494" />
+    <g
+       id="g1496" />
+    <g
+       id="g1498" />
+    <g
+       id="g1500" />
+    <g
+       id="g1502" />
+    <g
+       id="g1504" />
+    <g
+       id="g1506" />
+    <g
+       id="g1508" />
+    <g
+       id="g1510" />
+    <g
+       id="g1512" />
+    <g
+       id="g1514" />
+    <g
+       id="g1516" />
+    <g
+       id="g1518" />
+    <g
+       id="g1520" />
+    <g
+       id="g1522" />
+    <g
+       id="g1524" />
+    <g
+       id="g1526" />
+    <g
+       id="g1528" />
+    <g
+       id="g1530" />
+    <g
+       id="g1532" />
+    <g
+       id="g1534" />
+    <g
+       id="g1536" />
+    <g
+       id="g1538" />
+    <g
+       id="g1540" />
+    <g
+       id="g1542" />
+    <g
+       id="g1544" />
+    <g
+       id="g1546" />
+    <g
+       id="g1548" />
+    <g
+       id="g1550" />
+    <g
+       id="g1552" />
+    <g
+       id="g1554" />
+    <g
+       id="g1556" />
+    <g
+       id="g1558" />
+    <g
+       id="g1560" />
+    <g
+       id="g1562" />
+    <g
+       id="g1564" />
+    <g
+       id="g1566" />
+    <g
+       id="g1568" />
+    <g
+       id="g1570" />
+    <g
+       id="g1572" />
+    <g
+       id="g1574" />
+    <g
+       id="g1576" />
+    <g
+       id="g1578" />
+    <g
+       id="g1580" />
+    <g
+       id="g1582" />
+    <g
+       id="g1584" />
+    <g
+       id="g1586" />
+    <g
+       id="g1588" />
+    <g
+       id="g1590" />
+    <g
+       id="g1592" />
+    <g
+       id="g1594" />
+    <g
+       id="g1596" />
+    <g
+       id="g1598" />
+    <g
+       id="g1600" />
+    <g
+       id="g1602" />
+    <g
+       id="g1604" />
+    <g
+       id="g1606" />
+    <g
+       id="g1608" />
+    <g
+       id="g1610" />
+    <g
+       id="g1612" />
+    <g
+       id="g1614" />
+    <g
+       id="g1616" />
+    <g
+       id="g1618" />
+    <g
+       id="g1620" />
+    <g
+       id="g1622" />
+    <g
+       id="g1624" />
+    <g
+       id="g1626" />
+    <g
+       id="g1628" />
+    <g
+       id="g1630" />
+    <g
+       id="g1632" />
+    <g
+       id="g1634" />
+    <g
+       id="g1636" />
+    <g
+       id="g1638" />
+    <g
+       id="g1640" />
+    <g
+       id="g1642" />
+    <g
+       id="g1644" />
+    <g
+       id="g1646" />
+    <g
+       id="g1648" />
+    <g
+       id="g1650" />
+    <g
+       id="g1652" />
+    <g
+       id="g1654" />
+    <g
+       id="g1656" />
+    <g
+       id="g1658" />
+    <g
+       id="g1660" />
+    <g
+       id="g1662" />
+    <g
+       id="g1664" />
+    <g
+       id="g1666" />
+    <g
+       id="g1668" />
+    <g
+       id="g1670" />
+    <g
+       id="g1672" />
+    <g
+       id="g1674" />
+    <g
+       id="g1676" />
+    <g
+       id="g1678" />
+    <g
+       id="g1680" />
+    <g
+       id="g1682" />
+    <g
+       id="g1684" />
+    <g
+       id="g1686" />
+    <g
+       id="g1688" />
+    <g
+       id="g1690" />
+    <g
+       id="g1692" />
+    <g
+       id="g1694" />
+    <g
+       id="g1696" />
+    <g
+       id="g1698" />
+    <g
+       id="g1700">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,754.53)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text1704"><tspan
+           x="0 5.0040002 7.506"
+           y="0"
+           sodipodi:role="line"
+           id="tspan1702">0.0</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,807.46)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text1708"><tspan
+           x="0 5.0040002 7.506"
+           y="0"
+           sodipodi:role="line"
+           id="tspan1706">2.5</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,860.39)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text1712"><tspan
+           x="0 5.0040002 7.506"
+           y="0"
+           sodipodi:role="line"
+           id="tspan1710">5.0</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,913.32)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text1716"><tspan
+           x="0 5.0040002 7.506"
+           y="0"
+           sodipodi:role="line"
+           id="tspan1714">7.5</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,18.54,966.25)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text1720"><tspan
+           x="0 5.0040002 10.008 12.51"
+           y="0"
+           sodipodi:role="line"
+           id="tspan1718">10.0</tspan></text>
+    </g>
+    <g
+       id="g1722" />
+    <g
+       id="g1724" />
+    <g
+       id="g1726" />
+    <g
+       id="g1728" />
+    <g
+       id="g1730" />
+    <g
+       id="g1732" />
+    <g
+       id="g1734" />
+    <g
+       id="g1736" />
+    <g
+       id="g1738" />
+    <g
+       id="g1740" />
+    <g
+       id="g1742" />
+    <g
+       id="g1744" />
+    <g
+       id="g1746" />
+    <g
+       id="g1748" />
+    <g
+       id="g1750" />
+    <g
+       id="g1752" />
+    <g
+       id="g1754" />
+    <g
+       id="g1756" />
+    <g
+       id="g1758" />
+    <g
+       id="g1760" />
+    <g
+       id="g1762" />
+    <g
+       id="g1764" />
+    <g
+       id="g1766" />
+    <g
+       id="g1768" />
+    <g
+       id="g1770" />
+    <g
+       id="g1772" />
+    <g
+       id="g1774" />
+    <g
+       id="g1776" />
+    <g
+       id="g1778" />
+    <g
+       id="g1780" />
+    <g
+       id="g1782" />
+    <g
+       id="g1784" />
+    <g
+       id="g1786" />
+    <g
+       id="g1788" />
+    <g
+       id="g1790" />
+    <g
+       id="g1792" />
+    <g
+       id="g1794" />
+    <g
+       id="g1796" />
+    <g
+       id="g1798" />
+    <g
+       id="g1800" />
+    <g
+       id="g1802" />
+    <g
+       id="g1804" />
+    <g
+       id="g1806" />
+    <g
+       id="g1808" />
+    <g
+       id="g1810" />
+    <g
+       id="g1812" />
+    <g
+       id="g1814" />
+    <g
+       id="g1816">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,164.75,713.5)"
+         style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text1820"><tspan
+           x="0 7.9419999 14.058 17.721001 23.837 33 39.116001 44.616001 50.731998 59.895"
+           y="0"
+           sodipodi:role="line"
+           id="tspan1818">Chromosome</tspan></text>
+    </g>
+    <g
+       id="g1822" />
+    <g
+       id="g1824">
+      <text
+         xml:space="preserve"
+         transform="matrix(0,1,1,0,13.38,840.06)"
+         style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text1828"><tspan
+           x="0 6.1160002 14.674 22.615999 25.674 31.174 36.674 42.790001 46.452999"
+           y="0"
+           sodipodi:role="line"
+           id="tspan1826">LOD score</tspan></text>
+    </g>
+    <g
+       id="g1830" />
+    <g
+       id="g1832" />
+    <g
+       id="g1834" />
+    <g
+       id="g1836" />
+    <g
+       id="g1838" />
+    <g
+       id="g1840">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,179.75,993.9)"
+         style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text1844"><tspan
+           x="0 8.6639996 15.336 19.332001 26.004 29.34"
+           y="0"
+           sodipodi:role="line"
+           id="tspan1842">Data 2</tspan></text>
+    </g>
+    <g
+       id="g1846" />
+    <g
+       id="g1848" />
+    <g
+       id="g1850" />
+    <g
+       id="g1852" />
+    <g
+       id="g1854" />
+    <g
+       id="g1856" />
+    <g
+       id="g1858" />
+    <g
+       id="g1860" />
+    <g
+       id="g1862" />
+    <g
+       id="g1864" />
+    <g
+       id="g1866" />
+    <g
+       id="g1868" />
+    <g
+       id="g1870" />
+    <g
+       id="g1872" />
+    <g
+       id="g1874">
+      <g
+         id="g1876"
+         clip-path="url(#clipPath1880)" />
+    </g>
+    <g
+       id="g1882" />
+    <g
+       id="g1884">
+      <g
+         id="g1886"
+         clip-path="url(#clipPath1890)">
+        <path
+           d="m 393.48,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1892" />
+        <path
+           d="m 393.48,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1894" />
+        <path
+           d="m 393.48,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1896" />
+        <path
+           d="m 394.21,761.92 v 0 0 h 0.03 0.01 0.03 0.01 0.01 l 0.05,-0.37 0.01,-1.45 0.15,0.49 0.12,0.42 h 0.06 0.07 0.02 0.02 0.01 0.03 0.01 l 0.03,0.01 0.05,-0.01 h 0.02 l 0.16,-0.41 0.01,-0.01 h 0.08 0.19 l 0.03,0.12 0.15,2.14 h 0.1 0.01 0.02 0.02 0.02 0.14 0.04 l 0.1,0.82 0.3,2.78 0.06,0.43 0.22,3.25 0.03,-0.45 0.2,-4.72 0.1,-1.59 0.05,-0.8 h 0.03 v 0 l 0.22,4.69 0.11,2.21 h 0.05 l 0.14,-3.37 0.31,-6.38 0.01,0.47 0.29,-0.18 0.09,-0.2 0.21,-0.95 0.3,-1.02 0.3,0.13 0.07,0.13 0.24,1.94 0.19,1.28 0.11,-3.53 0.15,3.34 h 0.04 l 0.11,0.39 0.12,0.36 h 0.08 l 0.1,4.29 0.16,14.65 0.06,-1.59 0.09,-3.03 0.29,-12.74 0.01,0.08 0.29,107.95 0.01,6.12 0.13,-112.08 0.17,0.48 0.13,-0.01 h 0.03 0.01 0.01 0.01 v 0 h 0.01 v 0 h 0.01 0.07 0.03 0.03 v 0 h 0.04 v 0 h 0.02 l 0.01,-1.28 0.01,-0.07 0.01,-0.02 0.06,-0.19 v -0.5 l 0.12,-0.62 0.02,-1.15 h 0.08 0.08 0.01 0.02 v 0.24 h 0.09 0.01 l 0.09,6.94 0.1,-1.51 0.07,1.45 0.03,-3.36 0.09,-8.06 0.01,-0.01 0.1,0.01 0.03,2.17 0.08,0.11 0.01,0.1 0.29,-0.02 0.09,0.07 0.21,2.51 0.3,2.34 0.31,-3.52 v -0.1 l 0.22,-2.59 0.08,2.5 v 0.14 h 0.03 v 0 h 0.1 l 0.17,-0.29 0.3,-0.77 0.09,-0.3 0.21,-0.77 0.12,-0.37 h 0.06 v 0 0 h 0.01 0.01 l 0.11,-0.1 0.3,-0.22 0.07,-0.04 h 0.02 0.09 0.04 0.01 0.07 0.07 l 0.08,-0.06 0.04,0.29 h 0.01 0.01 l 0.07,0.03 v 0 h 0.01 l 0.01,-0.02 0.14,-0.22 h 0.06 l 0.11,0.19 0.3,0.68 0.3,0.82 0.3,0.95 0.15,0.49 0.13,-2.58 0.02,2.5 0.01,-0.03 0.13,0.23 0.09,-0.7 0.01,0.7 h 0.03 0.01 v 0 h 0.01 0.01 v 0 0 h 0.01 0.03 v 0 0 h 0.02 0.02 v 0 0 h 0.03 v 0 l 0.04,2.01 h 0.02 0.01 l 0.01,-2.32 h 0.1 v 0 l 0.02,0.24 0.02,0.33 0.01,-1.46 h 0.01 v 0 0 0 0 0 0 h 0.01 v 0 h 0.01 0.02"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path1898" />
+        <path
+           d="m 393.48,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1900" />
+      </g>
+    </g>
+    <g
+       id="g1902" />
+    <g
+       id="g1904">
+      <g
+         id="g1906"
+         clip-path="url(#clipPath1910)">
+        <path
+           d="m 409.53,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1912" />
+        <path
+           d="m 409.53,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1914" />
+        <path
+           d="m 409.53,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1916" />
+        <path
+           d="m 410.26,759.73 0.05,-1.01 0.13,-0.1 0.11,-0.43 0.28,-0.35 0.17,0.46 0.12,0.65 0.03,0.12 0.26,1.69 0.29,1.87 0.29,0.88 0.03,0.03 h 0.02 l 0.23,3.48 0.29,2.95 0.07,0.45 0.07,0.75 h 0.02 0.13 v 0 l 0.09,-0.7 0.2,-0.07 0.22,-0.94 h 0.06 0.01 0.01 0.03 0.01 0.07 0.01 0.03 0.01 0.12 v 0 h 0.04 0.07 l 0.08,0.38 h 0.01 0.06 0.02 0.03 0.01 l 0.02,-0.35 0.17,-1.83 0.03,-0.03 0.03,-0.39 0.08,-0.91 0.18,-1.78 0.03,-0.09 0.27,-2.95 0.02,-0.08 0.06,-0.21 0.07,0.54 h 0.06 0.03 0.07 0.02 l 0.05,1.32 0.21,-0.14 0.03,-0.02 h 0.01 l 0.04,-0.1 h 0.04 v 0 h 0.02 l 0.01,1.93 v 0 h 0.01 v -0.03 0.03 h 0.01 v 0 h 0.02 0.01 v 0 l 0.09,1.07 0.08,0.8 v 0 h 0.02 0.01 l 0.07,-6.7 h 0.03 l 0.07,-0.8 h 0.01 0.02 l 0.1,0.04 h 0.03 l 0.11,-0.17 0.03,0.35 0.06,1.28 h 0.01 0.03 0.02 0.12 0.05 0.02 0.07 l 0.19,-0.44 0.01,-0.02 h 0.12 0.03 v 0 h 0.04 0.01 v 0 l 0.02,-0.07 0.02,0.85 0.03,-1.14 h 0.01 0.03 v 0 l 0.15,0.46 h 0.03 0.08 0.01 v 0 h 0.01 l 0.14,0.62 0.09,1.96 h 0.01 0.02 v 0 h 0.01 0.02 0.01 l 0.19,-0.8 h 0.01 0.01 0.01 0.03 l 0.01,-0.06 0.03,-0.43 h 0.03 v 0 h 0.03 0.02 0.03 0.03 v 0.49 l 0.07,-1.76 v 0 l 0.04,-0.29 0.08,-0.52 0.06,-1.62 0.01,0.07 h 0.02 0.06 l 0.06,-0.08 h 0.01 l 0.05,0.13 0.02,0.14 h 0.01 v 0 l 0.09,-0.28 h 0.01 0.01 0.01 0.03 0.01 l 0.01,-0.04 v 0 h 0.03 0.01 0.01 l 0.03,0.16 v 0 h 0.06 0.02 v 0 h 0.02 0.01 l 0.13,0.06 0.12,0.2 0.05,-0.13 0.12,0.14 0.09,0.13 h 0.1 0.06 l 0.03,0.13 0.04,0.13 h 0.05 0.05 0.04 0.06 l 0.03,0.42 h 0.02 v 0 h 0.02 0.07 l 0.01,0.42 h 0.01 v 0 0 0 h 0.01 0.01 l 0.01,0.69 0.15,-0.69 0.09,-0.12 h 0.05 0.02 v 0 h 0.02 0.03 0.05 0.01 0.02 0.07 0.05 0.03 l 0.01,0.24 h 0.04 l 0.09,0.12 0.03,0.05 0.11,-0.56 v 0.08 l 0.02,-0.27 0.09,0.24 h 0.03 v 0 0 h 0.02 l 0.05,0.38 v 0 l 0.18,1.81 h 0.01 l 0.03,-0.35 0.21,-2.72 0.08,-0.01 v 0 0 l 0.02,0.04 h 0.1 l 0.06,0.23 h 0.09 0.02 0.12 l 0.08,0.14 0.05,-0.22 0.04,-0.06 0.1,0.08 0.19,1.7 0.09,1.38 0.08,0.36 0.11,0.2 0.29,1.84 0.17,0.77 h 0.01 0.11 0.05 0.01 l 0.23,0.37 0.19,0.33 0.1,-0.56 0.28,-1.62 v -0.02 l 0.23,-0.76 v 0 l 0.06,-1.43 0.11,0.51 v 0 h 0.01 l 0.06,-0.61 0.01,-0.27"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path1918" />
+        <path
+           d="m 409.53,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1920" />
+      </g>
+    </g>
+    <g
+       id="g1922" />
+    <g
+       id="g1924">
+      <g
+         id="g1926"
+         clip-path="url(#clipPath1930)">
+        <path
+           d="m 425.58,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1932" />
+        <path
+           d="m 425.58,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1934" />
+        <path
+           d="m 425.58,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1936" />
+        <path
+           d="m 426.31,769.39 0.39,-1.84 0.39,-2.08 0.39,-2.28 0.39,-2.38 0.39,-1.99 0.38,-0.94 0.19,-0.11 0.2,0.14 0.39,0.82 0.39,1.32 0.13,0.48 0.26,0.28 0.39,0.43 0.04,0.04 h 0.13 l 0.22,0.04 0.39,0.06 0.39,-0.03 0.39,-0.21 0.38,-0.41 0.39,-0.51 0.39,-0.43 0.35,-0.24 h 0.04 0.02 l 0.19,-1.03 0.06,-0.17 v 0 l 0.12,0.22 0.22,0.48 h 0.02 l 0.05,-0.14 h 0.03 0.01 0.04 0.02 0.05 0.03 l 0.06,0.83 v 0 h 0.05 l 0.11,-0.13 0.09,-0.17 0.32,-0.42 0.07,-0.02 0.39,-0.13 0.11,-0.05 0.18,-0.32 0.1,-0.11 0.28,-0.25 h 0.1 0.27 v 0 l 0.04,0.09 h 0.05 0.03 v 0 0 0 h 0.01 v 0 h 0.01 v 0 0 0 0 0 0 0 0 0 l 0.33,0.19 h 0.04 0.03 l 0.24,0.59 h 0.04 0.08 0.01 0.1 l 0.07,-0.48 0.08,0.42 h 0.01 l 0.06,0.41 0.06,-0.16 0.28,-0.64 0.02,0.33 0.09,0.05 0.39,0.74 0.2,0.68 0.19,0.61 0.11,0.37 0.28,0.56 0.01,0.04 h 0.26 l 0.12,1.8 0.38,3.45 0.01,0.03 h 0.02 l 0.36,2.95 0.09,0.53 0.11,-1.4"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path1938" />
+        <path
+           d="m 425.58,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1940" />
+      </g>
+    </g>
+    <g
+       id="g1942" />
+    <g
+       id="g1944">
+      <g
+         id="g1946"
+         clip-path="url(#clipPath1950)">
+        <path
+           d="m 441.63,974.93 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1952" />
+        <path
+           d="m 441.63,962.57 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1954" />
+        <path
+           d="m 441.63,912.04 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1956" />
+        <path
+           d="m 442.36,758.92 0.16,0.15 0.12,-0.78 0.06,0.49 0.04,0.1 0.07,-0.22 h 0.08 l 0.15,2.33 0.02,0.49 0.03,-2.46 0.18,0.27 0.09,-0.44 h 0.02 l 0.18,0.04 0.15,0.23 0.05,0.07 v 0.05 l 0.02,0.7 h 0.03 v 0 l 0.23,-0.9 h 0.01 l 0.08,-0.04 h 0.02 0.15 l 0.09,0.13 0.1,0.22 0.23,-0.55 0.18,-0.33 h 0.03 l 0.13,-0.1 0.31,-0.22 0.01,0.07 h 0.01 0.01 0.07 0.01 l 0.26,-0.24 0.14,-0.08 0.01,-0.13 h 0.01 0.01 0.01 l 0.01,0.04 0.06,0.08 h 0.07 0.01 0.07 l 0.08,0.13 0.18,2.64 h 0.01 0.01 v 0 h 0.02 0.09 l 0.08,-1.65 0.14,1.47 0.09,0.45 h 0.14 l 0.02,0.2 h 0.03 v 0 l 0.06,-0.01 0.33,1.75 0.14,-2.19 0.19,-1.76 h 0.01 v 0 h 0.01 0.01 0.07 0.04 0.03 0.1 v 0 h 0.06 0.02 v 0 h 0.08 0.02 0.09 l 0.12,0.27 h 0.01 l 0.02,-0.22 0.14,-0.16 h 0.09 0.01 l 0.09,0.47 0.1,0.52 h 0.05 l 0.17,-0.02 h 0.02 0.07 0.12 0.02 v 0 0 h 0.1 l 0.03,0.09 0.22,0.74 h 0.03 l 0.03,-0.61 h 0.01 l 0.05,-0.23 0.28,-0.17 0.05,0.29 0.14,0.76 h 0.07 l 0.05,-0.81 h 0.03 l 0.05,0.68 0.01,0.09 0.19,-0.82 h 0.02 0.01 0.01 0.09 l 0.01,0.01 0.28,0.08 h 0.04 l 0.02,-0.01 0.25,-0.22 0.08,0.01 0.11,0.02 0.09,0.11 h 0.03 0.06 l 0.04,-1.18 0.01,0.03 0.27,1.15 0.07,-0.07 0.19,-0.11 h 0.06 v 0 h 0.02 0.06 v 0 h 0.05 l 0.17,0.81 0.12,-0.68 0.02,-0.1 0.02,3.47 0.22,-3.98 0.08,-0.66 0.05,-0.04 h 0.02 l 0.27,0.22 0.04,0.13 0.11,0.06 h 0.05 0.03 v 0 h 0.05 l 0.05,-0.36 v -0.01 l 0.06,-0.08 h 0.01 0.02 0.01 0.01 0.01 0.02 l 0.08,0.04 h 0.03 l 0.09,-0.65 0.03,0.13 h 0.18 l 0.13,0.03 0.27,0.15 h 0.01 l 0.06,-0.13 0.09,-0.05 0.16,0.11 h 0.08 v 0 h 0.03 v 0 l 0.05,0.03 0.03,-0.02 0.01,0.01 0.02,-0.02 h 0.2 0.27 0.07 0.09 l 0.16,-0.11 0.09,-0.01 0.33,0.18 0.26,0.38 0.08,0.13 0.03,0.05 h 0.06"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path1958" />
+        <path
+           d="m 441.63,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1960" />
+      </g>
+    </g>
+    <g
+       id="g1962" />
+    <g
+       id="g1964">
+      <g
+         id="g1966"
+         clip-path="url(#clipPath1970)">
+        <path
+           d="m 457.69,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1972" />
+        <path
+           d="m 457.69,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1974" />
+        <path
+           d="m 457.69,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1976" />
+        <path
+           d="m 458.42,762.61 0.33,-2.19 0.34,2.9 0.08,1.3 0.26,-0.29 0.34,-0.56 0.34,-0.76 0.34,-0.91 0.34,-1.01 0.34,148.17 0.34,-7.14 0.34,-60.38 0.1,-78.88 0.24,32.23 0.24,-24.83 v 0 l 0.02,-8.37 0.05,-0.01 0.03,0.16 0.14,1.45 v 0 h 0.01 0.03 v 0 h 0.01 0.03 0.05 v 0 l 0.05,-0.33 h 0.02 0.03 0.02 l 0.01,-1.35 v 0 0 h 0.07 l 0.04,-0.4 h 0.02 v 0 h 0.05 l 0.06,-0.01 0.02,0.01 h 0.02 0.02 0.02 0.01 0.01 0.01 0.01 v 0 0 h 0.01 v 0 h 0.04 0.03 v 0 h 0.02 v 0 h 0.03 0.01 v 0 h 0.01 v 0 l 0.01,0.52 h 0.05 0.05 0.02 l 0.25,-1.67 h 0.06 0.03 l 0.09,-0.26 0.14,0.2 h 0.08 0.01 0.08 0.01 l 0.08,0.18 0.06,-0.94 h 0.03 0.02 0.05 0.01 0.03 l 0.01,1 0.28,0.03 h 0.01 0.05 0.07 0.01 0.03 v 0 h 0.03 0.01 0.04 v 0 0 h 0.01 0.01 l 0.01,-1.98 v 0 l 0.03,0.07 h 0.02 0.02 v 0 h 0.04 l 0.04,0.09 0.02,-0.09 0.1,-0.24 0.1,0.03 h 0.04 0.03 l 0.06,0.2 h 0.01 l 0.24,-0.39 0.01,-0.01 0.06,-0.09 0.06,-0.16 0.04,0.24 h 0.03 l 0.03,0.46 v 0 h 0.01 v 0 0 h 0.1 0.01 v 0 l 0.13,-0.13 v 0 0 h 0.01 0.04 v 0 h 0.05 0.08 0.01 v 0 h 0.01 0.02 0.13 0.04 l 0.05,2.24 h 0.02 l 0.06,-0.72 0.02,-0.05 0.05,-0.12 0.29,-0.32 0.08,-0.1 0.01,0.18 h 0.01 v 0 0 h 0.05 0.02 v 0 l 0.1,0.41 h 0.04 l 0.03,-0.04 0.34,-0.44 0.11,-0.12 v 0 h 0.02 l 0.02,1.41 h 0.01 v 0 h 0.03 l 0.15,-1.3 0.04,-0.25 0.08,-0.15 0.04,-0.46 h 0.02 l 0.08,0.56 h 0.02 l 0.06,-0.41 0.1,-0.35 0.14,-0.62 h 0.07 l 0.03,-0.04 0.18,1.11 h 0.15 0.1 0.24 0.04 l 0.3,0.36 0.05,0.11 0.04,-0.22 0.25,0.01 h 0.34 l 0.14,-0.01 0.05,0.45 0.15,-0.02 0.23,-0.03 0.11,-0.49 0.3,-0.77 h 0.04 0.02 l 0.03,-0.33 0.29,-0.04 0.23,-0.03 h 0.04 0.07 l 0.34,0.17 0.11,0.1 0.23,4.2 v 0.01"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path1978" />
+        <text
+           xml:space="preserve"
+           transform="scale(1,-1)"
+           style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#e41a1c;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text1982"
+           x="459.60001"
+           y="-916.89001"><tspan
+             x="459.60001 465.716"
+             y="-916.89001"
+             sodipodi:role="line"
+             id="tspan1980">p4</tspan></text>
+        <path
+           d="m 457.69,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1984" />
+      </g>
+    </g>
+    <g
+       id="g1986" />
+    <g
+       id="g1988">
+      <g
+         id="g1990"
+         clip-path="url(#clipPath1994)">
+        <path
+           d="m 473.74,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path1996" />
+        <path
+           d="m 473.74,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path1998" />
+        <path
+           d="m 473.74,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2000" />
+        <path
+           d="m 474.47,765 h 0.11 0.07 0.09 l 0.09,-0.54 0.03,-4 v -0.23 l 0.18,2.76 h 0.21 v 0.06 l 0.08,0.67 0.04,-4.42 0.02,1.54 h 0.05 0.04 l 0.17,1.63 0.33,2.9 h 0.01 0.01 0.04 0.04 l 0.11,1.84 h 0.03 0.02 l 0.13,-5.18 0.06,0.22 0.4,1.34 0.39,1.39 0.23,0.79 0.17,-0.91 0.39,-2.02 0.39,-1.57 0.17,-0.45 0.06,-0.02 0.07,-0.45 0.1,-0.01 h 0.06 0.33 0.03 v 0 l 0.02,0.02 h 0.01 l 0.29,0.61 h 0.01 l 0.03,0.02 0.06,0.04 0.12,-2.21 0.07,3.54 h 0.03 l 0.04,0.04 0.08,0.03 0.39,0.16 0.39,0.11 0.4,0.05 0.39,-0.05 0.24,-0.09 0.15,-0.58 0.4,-1.41 0.39,-1.17 0.39,-0.83 0.4,-0.49 0.39,-0.2 0.39,-0.01 0.06,0.01 0.34,1.05 0.39,2.87 0.39,2.88 0.4,1.18 0.39,-0.14 0.04,-0.04 0.36,0.09 0.39,-1.12 0.39,-2.04 0.34,-1.73 0.06,-0.2 0.39,-0.96 0.39,-0.1 0.14,0.14 h 0.05 0.02 0.02 0.01 l 0.16,-1.06 0.02,-0.15 0.01,-0.45 v 0"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2002" />
+        <path
+           d="m 473.74,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2004" />
+      </g>
+    </g>
+    <g
+       id="g2006" />
+    <g
+       id="g2008">
+      <g
+         id="g2010"
+         clip-path="url(#clipPath2014)">
+        <path
+           d="m 489.79,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2016" />
+        <path
+           d="m 489.79,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2018" />
+        <path
+           d="m 489.79,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2020" />
+        <path
+           d="m 490.52,762.65 v 0 0 0 0 h 0.01 0.04 v 0 0 0 0 0 0 0 h 0.07 l 0.02,-0.96 v 0 0 l 0.03,0.12 h 0.01 l 0.15,5.14 0.03,0.61 h 0.02 0.02 0.02 0.25 0.07 0.13 l 0.11,1.65 0.03,-0.02 0.22,-0.15 0.06,-1.27 0.05,3.31 0.01,6.18 0.1,-10.83 h 0.04 l 0.19,-1.98 0.33,-3.18 v -0.01 l 0.15,-3.38 0.19,1.49 v 0.03 l 0.06,-0.08 h 0.01 l 0.12,0.63 0.03,-0.07 h 0.11 0.22 0.01 v 0 h 0.01 0.02 v 0 l 0.08,0.03 0.11,0.07 h 0.01 0.21 0.01 v 0 h 0.03 v 0 h 0.08 v 0 0 l 0.04,-0.18 h 0.01 0.03 0.01 0.04 0.01 0.08 0.01 0.03 l 0.03,0.54 0.04,-0.42 h 0.1 l 0.01,-0.35 v 0 h 0.02 0.02 0.07 0.04 l 0.3,0.81 0.15,-0.29 v 0 h 0.01 l 0.08,-0.52 h 0.09 0.01 l 0.21,0.68 0.07,-0.78 0.05,-0.2 0.12,-0.47 0.04,-0.36 0.03,-0.08 v 0 l 0.05,0.52 v 0 h 0.01 0.03 0.01 0.04 v -0.16 l 0.01,-0.4 0.03,3.91 0.01,0.12 h 0.01 0.05 v 0 h 0.02 v 0 h 0.12 l 0.02,-1.36 h 0.01 l 0.06,0.03 0.24,0.61 0.09,0.68 0.02,0.1 0.09,1.92 h 0.02 0.03 l 0.18,-0.01 0.09,0.01 0.1,-0.01 0.09,0.02 h 0.04 0.01 0.11 l 0.21,0.91 h 0.01 v 0 l 0.01,-0.13 0.3,-3.82 0.03,-0.08 0.24,-0.44 h 0.1 0.03 0.01 0.01 0.02 0.03 v 0 h 0.04 l 0.08,1.76 0.01,0.44 0.11,0.76 0.07,0.47 h 0.03 0.09 0.01 l 0.07,-0.75 h 0.02 l 0.02,-0.31 h 0.02 0.04 0.07 0.14 0.03 l 0.06,-4.23 v -0.03 l 0.1,1.41 0.01,0.33 h 0.04 0.01 0.04 0.08 l 0.05,-2.41 v 0.06 l 0.03,0.4 v 0 h 0.01 0.22 0.08 l 0.12,-0.01 0.09,-0.08 v 0 h 0.02 l 0.09,0.65 h 0.01 l 0.09,0.03 0.12,-0.11 h 0.07 v 0 l 0.05,0.88 0.01,0.02 0.21,1.16 v 0 l 0.01,-0.48 h 0.03 0.01 v 0 0 h 0.01 0.01 v 0 l 0.01,0.37 v 0 l 0.01,0.23 h 0.01 v 0 h 0.01 l 0.01,-0.1 0.03,-0.13 h 0.07 0.01 0.07 l 0.09,3.86 0.04,1.47 0.03,-0.06 0.1,-0.09 0.23,-1.43 0.07,-0.47 0.08,1.16 v 0 h 0.04 l 0.01,-1.12 v 0 h 0.05 l 0.07,0.23 0.02,-0.45 0.02,-0.55 h 0.04 l 0.08,-0.03 v 0 h 0.01 0.06 0.06 l 0.06,-0.52 0.07,-0.54 h 0.04 l 0.11,0.34 0.12,-0.11 0.33,-0.31 0.07,-0.07 v 0 0 0 h 0.01 0.03 0.15 0.03 l 0.05,0.02 0.16,0.08 v 0.08 h 0.07 l 0.1,-0.94 0.05,-0.45 h 0.07 l 0.22,0.07 h 0.01 l 0.05,-0.25 0.06,-2.87 0.21,-0.11 0.03,-0.01 0.02,-0.22 h 0.01 0.01 l 0.11,-0.03 v 0 l 0.06,0.01 h 0.1 0.02 l 0.31,0.89 0.01,0.03 h 0.05 l 0.07,-0.52 h 0.05 v 0"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2022" />
+        <path
+           d="m 489.79,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2024" />
+      </g>
+    </g>
+    <g
+       id="g2026" />
+    <g
+       id="g2028">
+      <g
+         id="g2030"
+         clip-path="url(#clipPath2034)">
+        <path
+           d="m 505.84,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2036" />
+        <path
+           d="m 505.84,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2038" />
+        <path
+           d="m 505.84,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2040" />
+        <path
+           d="m 506.57,772.15 0.01,2.63 0.02,-0.15 h 0.02 0.03 0.02 0.01 l 0.05,4.7 0.08,-4.7 h 0.16 0.03 l 0.11,0.7 0.24,-12.8 0.02,3.42 0.06,3.58 0.34,-2.87 0.4,-3.3 0.4,-2.64 0.4,-1.58 0.31,-0.44 0.09,1.87 0.15,2.64 0.25,0.2 0.4,0.12 0.27,-0.08 h 0.13 0.02 l 0.29,-0.59 h 0.01 0.01 l 0.07,-0.09 0.02,-0.03 0.05,0.12 v 0 h 0.01 0.03 l 0.29,1.5 0.03,0.17 h 0.09 l 0.01,0.14 v 0 l 0.1,-0.75 0.04,3.66 h 0.02 l 0.11,0.34 0.04,0.14 h 0.05 0.1 0.04 v 0 0 0 l 0.04,-4.87 h 0.08 l 0.03,3.44 h 0.02 0.06 l 0.12,1.24 h 0.01 0.03 v 0 0 h 0.04 l 0.14,-1.87 0.04,-0.69 0.22,-6.43 h 0.02 l 0.12,-0.87 0.05,0.09 h 0.01 0.05 0.17 0.04 0.01 l 0.01,-0.1 h 0.02 l 0.04,0.01 0.17,0.06 h 0.01 v 0 h 0.01 v 0 h 0.01 v 0 h 0.1 l 0.04,-0.07 h 0.06 0.05 l 0.1,0.12 v 0 l 0.25,0.15 0.4,0.83 0.26,0.81 h 0.05 l 0.04,-0.32 h 0.05 0.05 v 0 h 0.03 v 0 h 0.05 0.03 v 0 0 h 0.04 0.03 v 0 l 0.17,0.02 0.16,0.02 h 0.02 l 0.22,-0.26 0.1,0.51 h 0.01 l 0.08,1.39 h 0.06 0.07 0.06 0.01 0.06 0.05 0.03 l 0.26,0.51 0.29,1 0.11,0.27 0.04,0.09 h 0.19 l 0.17,-1.16 0.18,-0.02 h 0.16 l 0.06,-1.84 0.4,1.05 0.09,3.33 0.16,-1.04 0.06,-0.02 h 0.09 0.02 l 0.15,1.17 0.23,1.17 0.09,0.41 0.31,-0.94 0.4,-1.07 0.4,-0.85 0.4,-0.59 0.11,-0.11 v 0 h 0.01 0.02 v 0 h 0.05 l 0.21,-0.17 0.2,-0.15"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2042" />
+        <path
+           d="m 505.84,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2044" />
+      </g>
+    </g>
+    <g
+       id="g2046" />
+    <g
+       id="g2048">
+      <g
+         id="g2050"
+         clip-path="url(#clipPath2054)">
+        <path
+           d="m 521.89,974.93 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2056" />
+        <path
+           d="m 521.89,962.57 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2058" />
+        <path
+           d="m 521.89,912.04 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2060" />
+        <path
+           d="m 522.62,763.62 h 0.06 0.06 0.03 l 0.05,-1.8 0.04,0.02 0.02,-0.02 v 0 h 0.01 v 0.05 l 0.14,-1.5 0.41,-0.99 0.02,0.15 h 0.34 l 0.04,0.85 0.02,0.32 v 0 h 0.03 0.02 0.03 0.01 l 0.3,-2.34 0.08,-0.34 h 0.32 0.28 l 0.13,-0.06 0.41,-0.08 0.4,0.08 0.12,0.05 0.07,-0.16 0.1,0.09 0.12,0.19 0.1,0.25 0.18,-0.38 h 0.02 v 0 0 h 0.03 0.01 l 0.06,0.05 0.13,0.13 h 0.28 0.06 0.01 l 0.1,-0.27 0.12,-0.07 h 0.02 0.03 l 0.02,0.11 h 0.05 0.03 0.03 0.02 0.1 l 0.07,-0.03 h 0.02 0.03 v 0 h 0.03 0.07 0.1 0.11 l 0.2,0.06 0.4,0.2 0.41,0.26 0.4,0.28 0.41,0.21 0.41,0.08 h 0.17 l 0.16,0.35 0.07,-0.9 0.41,2.49 0.05,0.04 h 0.02 0.02 l 0.22,-2.79 0.09,-0.04 0.08,-0.04 h 0.05 0.03 0.07 v 0 h 0.04 0.08 0.05 0.01 v 0 h 0.04 0.1 v 0 h 0.08 0.09 0.03 l 0.07,-0.1 0.13,-0.12 h 0.17 0.06 0.04 0.02 l 0.03,-0.08 0.16,0.11 v 0 h 0.07 0.01 l 0.12,0.01 0.4,-0.01 0.41,0.06 0.16,0.08 0.01,-0.08 0.24,0.52 0.4,1.29 0.41,0.27 0.24,-0.39 0.16,-0.15 0.41,0.34 0.37,0.17 h 0.04 0.03 0.12 l 0.25,-0.28 0.2,-0.17 h 0.03 0.03 0.03 l 0.1,0.03"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2062" />
+        <path
+           d="m 521.89,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2064" />
+      </g>
+    </g>
+    <g
+       id="g2066" />
+    <g
+       id="g2068">
+      <g
+         id="g2070"
+         clip-path="url(#clipPath2074)">
+        <path
+           d="M 537.95,974.93 H 554"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2076" />
+        <path
+           d="M 537.95,962.57 H 554"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2078" />
+        <path
+           d="M 537.95,912.04 H 554"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2080" />
+        <path
+           d="m 538.68,762.39 h 0.02 0.07 0.06 l 0.23,2.56 h 0.01 0.02 0.01 v 0 h 0.01 0.01 l 0.06,1.8 v 0 h 0.01 v 0 h 0.03 v 0 l 0.02,0.18 h 0.01 0.06 0.02 0.01 v 0 l 0.03,1.65 h 0.01 0.01 0.03 0.05 v 0 h 0.04 v 0 0 h 0.04 0.01 v 0 0.54 h 0.12 l 0.19,0.89 0.16,0.73 0.05,0.21 0.17,-7.95 0.01,-0.16 0.16,-1.44 0.01,-0.68 h 0.12 0.08 v 0 h 0.03 0.03 0.02 v 0 0 l 0.01,0.02 0.07,-0.02 h 0.06 0.03 0.01 0.03 v 0 h 0.06 l 0.07,0.72 0.4,4.4 0.4,2.67 0.03,0.16 0.36,0.39 0.4,6.12 0.16,-5.37 h 0.09 l 0.07,0.72 v 0 H 543 v 0 0 h 0.01 0.01 0.01 v 0 h 0.01 v 0 0 h 0.04 v 0 h 0.04 0.01 l 0.3,-0.29 0.34,-4.35 0.06,0.08 0.4,1 0.39,1.96 0.4,2.05 0.01,0.05 0.39,-2.07 0.39,-3.35 0.4,-3.64 0.28,-2.49 0.04,0.91 h 0.03 v 0 l 0.05,-2.59 0.06,3.68 h 0.03 0.01 l 0.27,-2.23 h 0.02 0.02 0.11 0.01 v 0 h 0.05 l 0.2,0.35 h 0.01 0.02 l 0.05,0.59 h 0.02 l 0.2,-1.72 h 0.03 l 0.08,1.37 0.02,0.77 0.03,0.03 h 0.05 0.19 l 0.1,0.42 0.09,0.46 0.12,0.31 0.05,-0.06 0.04,0.06 h 0.02 0.08 0.08 0.01 l 0.02,-1.58 h 0.18 l 0.1,0.04 0.18,0.06 h 0.03 0.04 0.13 0.02 v 0 l 0.12,0.4 0.25,-0.19 0.03,-0.02 0.07,-0.06 v 0 h 0.05 0.22 l 0.05,-0.18 0.13,-0.39 h 0.25 0.02 v 0 l 0.4,-0.36 0.2,-0.16 0.14,-1.17 h 0.01 0.04 0.15 l 0.04,-0.22 0.15,0.03 h 0.01 l 0.05,0.27 0.01,0.08 h 0.01 0.11 0.02 l 0.25,-0.53 0.08,0.21 h 0.01 l 0.18,-0.13 0.08,0.38 h 0.01 0.03 0.02 0.02 l 0.05,0.08 h 0.06 0.06 0.07 v 0 0 0 h 0.02 0.01 0.03 v 0 h 0.06 0.09 0.04 v 0 h 0.01 v 0 0 h 0.01 0.01 v 0 l 0.16,-0.46"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2082" />
+        <path
+           d="M 537.95,746.9 H 554 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2084" />
+      </g>
+    </g>
+    <g
+       id="g2086" />
+    <g
+       id="g2088">
+      <g
+         id="g2090"
+         clip-path="url(#clipPath2094)">
+        <path
+           d="m 554,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2096" />
+        <path
+           d="m 554,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2098" />
+        <path
+           d="m 554,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2100" />
+        <path
+           d="m 554.73,764.65 0.09,0.03 h 0.02 0.03 v 0 H 555 v 0 0 l 0.01,2.47 0.07,0.18 0.05,0.11 h 0.13 l 0.18,0.22 0.13,0.18 0.1,-0.57 h 0.05 0.07 v 0 l 0.06,-0.2 0.18,0.6 h 0.02 l 0.09,-0.32 0.17,-0.55 0.19,1.19 0.26,1.67 h 0.04 l 0.04,8.38 v 0 l 0.01,-15.79 0.01,6.02 0.16,-0.37 h 0.09 0.02 l 0.02,-0.07 v 0 l 0.02,-0.05 0.03,0.05 v 0 0 h 0.05 l 0.16,9.16 0.11,0.21 0.02,5.98 0.02,-0.15 0.04,1.31 h 0.01 0.04 0.02 0.03 l 0.07,-0.16 0.14,-5.78 0.05,-2.46 h 0.16 l 0.15,-0.49 0.06,-0.2 h 0.14 0.02 0.04 0.02 0.07 0.01 0.01 0.07 0.07 0.09 l 0.1,0.03 0.36,0.25 0.35,0.24 0.28,0.07 0.07,-4.45 0.02,-1.24 0.13,7.7 0.06,2.34 0.15,-1.26 0.13,-1.31 0.11,-10.71 0.11,2.58 v 0.01 l 0.08,-0.57 0.16,-1.99 0.02,0.39 h 0.01 v 0 0 l 0.06,-1.19 0.03,0.68 0.03,0.65 0.13,0.2 h 0.03 l 0.16,7.45 0.02,0.5 h 0.01 l 0.18,1.65 h 0.02 l 0.12,3.09 v 0 h 0.11 l 0.14,-0.67 h 0.11 0.01 v 0 l 0.15,4.73 h 0.05 0.04 v 0 l 0.03,-1.95 h 0.05 0.02 v 0 h 0.08 0.05 0.08 l 0.12,3.16 0.02,-0.01 0.07,0.01 h 0.19 l 0.08,-0.56 v 0 l 0.02,0.01 0.15,-0.01 h 0.01 v 0 0 l 0.06,-4.64 h 0.03 0.02 l 0.03,-1.67 h 0.04 0.01 0.05 v 0 h 0.02 l 0.29,2.65 0.05,-2.14 0.09,0.11 0.07,-2.28 0.14,0.96 0.22,2.97 v -3.95 l 0.13,0.17 0.04,0.05 h 0.01 0.01 v 0 l 0.02,-1.06 h 0.01 v 0 0 h 0.01 0.01 0.02 0.09 0.05 l 0.04,1.87 h 0.05 v 0 l 0.35,6.4 0.13,2.01 0.08,-0.01 0.14,0.01 0.04,-0.01 0.16,-2.91 0.16,9.73 v 0.09 h 0.01 0.02 l 0.13,0.08 h 0.03 0.01 v 0 l 0.04,2.57 h 0.04 0.01 0.01 v 0 h 0.01 0.02 v 0 h 0.01 0.01 v -0.65 l 0.07,-14.52 v 0 h 0.22 0.01 l 0.06,0.1 0.35,-0.1 0.28,-1.11 0.07,-0.39 0.26,-1.57 h 0.06 l 0.04,0.02 0.35,0.19 0.06,0.04 0.03,-0.19 0.15,-0.91 0.11,-0.06 0.07,-0.02 0.13,-12.4 v 0 l 0.16,0.82 0.01,0.03 0.11,2.55 h 0.04 l 0.14,-0.13 0.05,0.05 0.09,0.12"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2102" />
+        <path
+           d="m 554,746.9 h 16.05 V 985.79 H 554 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2104" />
+      </g>
+    </g>
+    <g
+       id="g2106" />
+    <g
+       id="g2108">
+      <g
+         id="g2110"
+         clip-path="url(#clipPath2114)">
+        <path
+           d="M 570.05,974.93 H 586.1"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2116" />
+        <path
+           d="M 570.05,962.57 H 586.1"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2118" />
+        <path
+           d="M 570.05,912.04 H 586.1"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2120" />
+        <path
+           d="m 570.78,769.01 h 0.06 l 0.15,-0.28 0.26,-1.03 0.03,-0.01 0.24,0.03 h 0.08 l 0.13,1.02 0.21,1.64 h 0.02 0.01 l 0.04,-0.01 h 0.01 l 0.18,2.23 v 0.02 l 0.03,0.02 0.03,-0.01 0.03,-1.38 h 0.03 l 0.03,-0.8 0.01,0.26 0.07,-1.02 h 0.07 l 0.14,-6.45 h 0.02 0.01 0.03 0.13 0.08 v 0 l 0.04,1.77 h 0.17 0.01 l 0.01,0.03 0.48,0.85 0.45,0.78 0.02,-0.07 0.2,-1.21 h 0.27 0.01 0.01 0.05 l 0.14,-0.38 h 0.09 0.06 0.07 v 0 l 0.04,0.04 0.17,0.34 h 0.02 0.04 0.03 0.08 0.06 l 0.08,-0.06 0.07,-0.08 h 0.05 0.06 l 0.2,-0.43 0.09,0.54 0.19,1.33 h 0.01 0.16 l 0.08,0.03 0.03,-0.05 v 0.11 l 0.05,1.6 h 0.01 l 0.25,1.47 h 0.09 l 0.07,-0.39 0.23,-1.96 h 0.01 v 0 0 l 0.03,0.82 0.18,-4.43 0.03,0.55 0.06,1.58 h 0.06 0.02 v 0 h 0.01 v 0 h 0.13 l 0.19,-0.31 0.17,-0.26 v 0 h 0.02 l 0.01,0.02 h 0.01 l 0.03,-0.15 h 0.02 0.13 0.03 l 0.05,0.02 0.38,0.11 0.09,2.47 v 0 h 0.03 0.04 l 0.41,-0.43 0.32,-0.34 0.11,-4.88 h 0.04 v 0 l 0.41,-0.37 0.06,0.01 0.4,0.08 h 0.04 l 0.03,-0.14 0.01,-0.03 v 0 h 0.06 l 0.04,-0.03 h 0.01 l 0.11,1.32 v 0 h 0.08 v 0 h 0.17 0.11 0.09 0.05 l 0.22,-3.03 0.14,-1.42 h 0.33 0.01 v -0.04 h 0.09 v 0 h 0.05 l 0.11,3.1 h 0.01 0.04 0.07 0.09 0.02 l 0.46,-2.08 0.47,-1.18 0.15,-0.17 h 0.32 0.31 l 0.16,0.26 0.05,0.3 0.14,-0.17 h 0.1 l 0.19,0.04 0.02,0.01 0.17,2.58 h 0.01 l 0.08,-2.78 0.09,0.18 0.04,-0.44"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2122" />
+        <path
+           d="M 570.05,746.9 H 586.1 V 985.79 H 570.05 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2124" />
+      </g>
+    </g>
+    <g
+       id="g2126" />
+    <g
+       id="g2128">
+      <g
+         id="g2130"
+         clip-path="url(#clipPath2134)">
+        <path
+           d="m 586.1,974.93 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2136" />
+        <path
+           d="m 586.1,962.57 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2138" />
+        <path
+           d="m 586.1,912.04 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2140" />
+        <path
+           d="m 586.83,757.86 0.46,-0.01 0.37,0.01 0.08,-0.03 0.46,-0.05 0.45,0.27 0.46,0.73 0.45,1.3 0.46,1.77 0.45,1.9 0.46,1.78 0.45,1.5 0.46,1.15 0.45,0.85 0.4,0.55 0.06,0.19 0.45,105.2 0.37,-32.16 0.06,-72.01 h 0.03 0.15 l 0.04,2.57 h 0.03 0.04 0.06 v 0 h 0.03 l 0.04,1.5 h 0.06 0.04 l 0.11,-4.97 0.05,-0.48 0.26,-0.57 0.3,-1.25 0.15,-0.61 0.04,-0.16 h 0.38 0.02 l 0.02,0.1 0.45,1.91 0.04,0.12 h 0.09 0.07 l 0.25,0.3 v 0 0 0 h 0.01 0.06 0.02 0.01 l 0.21,-0.17 0.15,1.62 0.08,0.69 0.22,-0.3 h 0.16 0.02 0.04 v 0 h 0.18 l 0.05,-2.19 h 0.04 0.01 0.11 0.03 l 0.2,-1.52 0.21,-0.11 0.01,0.06 h 0.01 0.13 0.08 l 0.24,-0.17 0.07,-0.02 h 0.01 v 0 h 0.03 0.06 l 0.21,-2.06 0.02,-0.14 h 0.01 v 0 0 h 0.05 0.19 v 0 h 0.02 l 0.24,0.04 v -0.07 l 0.13,-2.82 h 0.33 0.02 v 0 0 h 0.04 0.07 v 0 h 0.02 0.05 v 0 h 0.13 0.13 v 0 l 0.16,0.12 h 0.03 l 0.01,0.87 0.16,-3.19 v 0 0 h 0.01 v 0 0 h 0.01 v 0 0 h 0.01 v 0 0 l 0.02,0.46 h 0.02 v 0 0 h 0.02 0.01 0.02 v 0 h 0.01 0.01 0.01 0.16 0.02 0.12 l 0.07,-2.25 h 0.03 0.01 0.02"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2142" />
+        <path
+           d="m 586.1,746.9 h 16.05 V 985.79 H 586.1 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2144" />
+      </g>
+    </g>
+    <g
+       id="g2146" />
+    <g
+       id="g2148">
+      <g
+         id="g2150"
+         clip-path="url(#clipPath2154)">
+        <path
+           d="m 602.16,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2156" />
+        <path
+           d="m 602.16,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2158" />
+        <path
+           d="m 602.16,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2160" />
+        <path
+           d="m 602.88,774.09 0.09,-0.52 0.14,-1.64 v 0 l 0.07,-2.19 h 0.03 v 0 l 0.1,-0.77 0.05,-0.77 0.05,-0.69 h 0.03 0.01 0.02 l 0.36,-0.35 0.1,-0.08 0.38,5.01 0.14,1.95 v 0.02 l 0.01,0.05 v 0 0 h 0.04 0.01 0.02 0.01 v 0 h 0.06 0.18 v 0 h 0.37 l 0.01,1.4 h 0.04 l 0.06,3.03 0.13,4.96 0.14,-2.84 0.2,0.34 0.48,0.49 0.12,0.07 0.15,-2.75 0.2,1.82 v 0.01 l 0.07,-2.07 v -6.42 h 0.01 0.02 l 0.21,-5.37 h 0.08 l 0.02,-1.45 h 0.05 v 0 h 0.02 0.07 l 0.36,-0.33 h 0.01 0.03 0.15 0.13 l 0.15,-0.12 0.01,0.12 h 0.04 0.19 0.03 l 0.06,4.04 h 0.02 l 0.17,-0.29 0.45,-0.73 0.03,-0.06 0.41,-0.94 0.06,-0.65 0.19,-1.83 v 0.04 l 0.1,-0.04 0.12,-0.31 h 0.01 l 0.03,-1.25 0.02,0.16 0.02,0.09 v 0 l 0.25,2.06 0.07,-2.06 h 0.03 0.11 v 0 h 0.03 l 0.03,-0.08 h 0.13 l 0.28,-0.04 0.14,-0.02 h 0.02 l 0.23,2.36 h 0.03 l 0.06,1.18 0.41,6 h 0.06 v 0 h 0.07 l 0.02,13.05 0.11,-5.95 0.06,-8.07 v 0 h 0.02 l 0.13,2.34 v 0 l 0.04,0.23 h 0.03 0.02 0.01 0.01 0.06 0.02 0.01 0.03 0.07 l 0.24,-1.16 0.48,-2.38 0.25,-3.27 0.22,0.48 0.48,1.07 0.14,0.33 0.33,-2.92 0.48,-3.18 0.28,-0.81 h 0.01 0.01 l 0.05,-0.58 0.12,-0.14 0.3,-0.18 0.1,-0.01 0.07,0.42 0.48,3.08 0.47,3.31 0.04,0.22 0.09,-0.11 h 0.09 l 0.07,-0.29 0.07,0.14 v 0"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2162" />
+        <path
+           d="m 602.16,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2164" />
+      </g>
+    </g>
+    <g
+       id="g2166" />
+    <g
+       id="g2168">
+      <g
+         id="g2170"
+         clip-path="url(#clipPath2174)">
+        <path
+           d="m 618.21,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2176" />
+        <path
+           d="m 618.21,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2178" />
+        <path
+           d="m 618.21,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2180" />
+        <path
+           d="m 618.94,769.21 v 1.04 l 0.03,-0.17 0.12,0.2 0.23,-0.03 h 0.04 0.03 0.07 l 0.23,-0.02 0.2,-1.65 h 0.07 0.02 v 0 l 0.4,-0.07 h 0.11 0.01 0.01 0.02 0.01 v 0 h 0.04 0.19 0.07 0.08 0.07 l 0.03,-0.28 0.16,-1.71 h 0.36 0.03 0.21 l 0.28,0.18 v -0.02 h 0.01 l 0.02,1.67 h 0.09 l 0.02,-0.17 0.03,0.32 v 0 h 0.1 0.07 0.11 0.06 0.01 0.04 l 0.08,0.19 h 0.01 0.06 0.02 0.16 0.15 0.06 l 0.15,-2.39 h 0.04 l 0.1,0.76 h 0.01 0.01 0.15 0.12 0.13 l 0.27,-1.88 0.15,-1.01 h 0.29 l 0.08,-0.09 0.31,-0.34 h 0.12 0.07 l 0.02,-0.04 0.14,-0.27 h 0.03 l 0.35,-1.31 0.19,-0.65 h 0.02 0.09 l 0.08,0.01 h 0.02 0.01 v 0 h 0.01 0.1 0.05 l 0.25,-1.84 h 0.22 0.08 l 0.21,-1.52 h 0.23 v 0 l 0.05,0.08 h 0.03 l 0.44,-0.36 0.24,0.53 h 0.19 v 0 l 0.03,0.19 h 0.06 0.01 0.08 l 0.19,0.71 0.24,-0.06 0.14,-0.02 h 0.01 0.37 0.06 l 0.46,3.58 0.29,1.64 v 0 l 0.23,0.3 0.09,0.14 0.26,-0.47 v 0 h 0.1 0.06 0.01 0.02 v 0 h 0.05 v 0 0 l 0.02,-3.29 h 0.02 l 0.07,0.13 0.01,-0.69 h 0.01 0.05 0.02 l 0.25,0.52 0.04,0.1 h 0.04 0.04 0.01 l 0.03,-0.17 h 0.01 l 0.35,1.33 0.1,0.44 h 0.06 0.03 v 0 l 0.07,0.45 0.25,1.15 h 0.01 0.01 0.03 0.01 l 0.47,1.22 0.11,0.3 h 0.03 l 0.03,1 h 0.03 l 0.08,2.18 h 0.02 l 0.04,-0.02 0.09,-1.74 0.09,0.22 0.03,0.07"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2182" />
+        <path
+           d="m 618.21,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2184" />
+      </g>
+    </g>
+    <g
+       id="g2186" />
+    <g
+       id="g2188">
+      <g
+         id="g2190"
+         clip-path="url(#clipPath2194)">
+        <path
+           d="m 634.26,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2196" />
+        <path
+           d="m 634.26,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2198" />
+        <path
+           d="m 634.26,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2200" />
+        <path
+           d="m 634.99,760.28 h 0.04 0.03 l 0.12,0.21 0.1,0.87 0.24,-0.55 0.06,-0.11 0.47,-0.9 0.53,-0.67 0.53,-0.05 0.54,0.53 0.09,0.13 0.44,2.29 0.53,3.54 v 0 h 0.14 0.08 0.16 l 0.15,-0.72 0.14,-0.6 h 0.22 l 0.17,-0.01 h 0.01 l 0.21,-1.52 v 0 h 0.05 v 0 l 0.06,1.88 h 0.03 l 0.08,0.16 h 0.09 0.04 l 0.25,0.97 v 0 h 0.09 v 0 0 h 0.01 0.03 0.01 0.06 0.02 0.02 v 0 0 h 0.01 0.02 v 0 h 0.06 0.03 l 0.19,-0.6 h 0.06 l 0.16,-1.01 0.07,-0.36 0.07,1.9 h 0.02 l 0.15,0.97 h 0.03 0.06 0.1 0.01 0.02 0.01 0.01 l 0.01,-1.32 0.02,-0.62 0.18,0.63 0.27,1.08 h 0.04 0.05 l 0.02,-0.01 v 0.01 h 0.02 0.01 0.02 l 0.41,1.62 0.14,1 0.01,-0.02 0.01,-0.01 h 0.01 0.02 0.05 0.26 v -0.36 l 0.03,-0.95 0.11,-2.85 h 0.02 l 0.28,-0.21 0.12,-1.01 0.03,-0.22 h 0.02 l 0.1,0.73 0.26,-0.02 0.09,-1 0.03,-0.2 0.5,-3.41 h 0.02 0.01 0.04 0.12 l 0.11,0.52 0.06,0.6 0.21,-1.07 v -0.04 l 0.02,-0.02 0.18,-0.7 h 0.07 l 0.25,-0.19 0.01,0.01 0.01,0.18 0.23,-0.4 h 0.04 0.05 0.01 0.08 l 0.11,0.13 0.42,0.56 h 0.05 l 0.06,-0.43 0.07,-0.43 0.18,0.74 h 0.03 l 0.25,-1.18 0.36,1.72 0.01,6.68 h 0.02 l 0.14,-0.48 0.47,-1.44 h 0.06 0.05 l 0.2,0.25 0.14,-0.68 0.14,-0.85 0.17,-1.04 0.08,0.18"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2202" />
+        <path
+           d="m 634.26,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2204" />
+      </g>
+    </g>
+    <g
+       id="g2206" />
+    <g
+       id="g2208">
+      <g
+         id="g2210"
+         clip-path="url(#clipPath2214)">
+        <path
+           d="m 650.31,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2216" />
+        <path
+           d="m 650.31,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2218" />
+        <path
+           d="m 650.31,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2220" />
+        <path
+           d="m 651.04,782.08 h 0.02 l 0.04,7.84 0.43,-6.36 0.19,-2.48 0.16,0.83 0.14,-1.65 0.45,-5.25 0.05,-0.27 0.12,-0.76 h 0.05 0.09 l 0.06,-3.56 h 0.04 v 0 h 0.01 l 0.04,0.52 0.05,-0.52 h 0.01 0.02 v 0 h 0.02 0.08 0.03 0.11 0.08 0.03 0.02 l 0.12,0.86 0.02,0.12 h 0.04 0.1 l 0.19,12.1 0.14,-2.82 0.33,-7.88 0.02,-0.11 0.06,-0.04 h 0.08 0.03 l 0.27,-0.28 0.09,1.64 h 0.03 0.02 0.05 0.03 0.04 l 0.17,1.18 v 0 h 0.02 v 0 h 0.03 0.03 l 0.03,1.56 h 0.01 v 0 h 0.01 0.01 0.01 l 0.1,-0.15 0.3,-1.02 h 0.2 0.14 l 0.03,-2.09 h 0.01 0.01 0.01 l 0.29,-7.29 0.18,-3.43 h 0.01 l 0.17,-4.32 0.1,0.11 h 0.03 0.13 l 0.19,0.5 0.04,0.24 0.11,-1.1 0.02,0.36 0.05,1.14 0.14,-1.15 0.2,0.35 0.1,-0.4 v 0 l 0.06,-0.47 0.43,0.31 0.13,0.02 0.06,-0.22 0.19,0.36 h 0.09 0.02 0.21 l 0.07,0.17 0.22,0.22 0.49,0.64 0.04,0.06 0.17,2.08 h 0.05 0.17 l 0.06,-0.3 0.15,-0.75 h 0.02 0.06 0.09 l 0.17,0.17 0.27,0.32 0.2,-0.54 h 0.01 l 0.01,0.01 0.08,0.17 h 0.06 0.01 0.01 v 0 h 0.02 0.02 l 0.07,-0.65 h 0.1 0.01 0.11 0.11 l 0.08,-0.65 h 0.13 l 0.06,2.21 h 0.01 v 0.01 -0.01 h 0.08 v 0 h 0.02 0.06 0.01 0.01 0.01 v 0 l 0.3,-0.62 0.11,-0.04 0.23,-0.05 h 0.04 l 0.01,-0.02 0.08,0.02 0.13,-0.55 0.1,-0.46 0.39,-1.03 0.23,-0.48 h 0.04 v 0 l 0.02,0.21 0.12,-0.57 h 0.06 0.02 0.03 0.02 0.1 0.02 0.01 0.01 0.01 0.02 0.01 l 0.01,-0.23 0.08,0.25 0.05,-0.21 0.07,0.13 0.02,0.01 0.03,1.66 v 1.45 l 0.21,-1.98 0.16,-0.21 0.04,1.16 0.01,-0.18 0.07,0.54 0.06,0.44 h 0.03 l 0.01,-1.19 h 0.01 l 0.01,1.2 v 0 0 h 0.01 v 0 -2.79 0 l 0.19,1.51 0.02,0.43"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2222" />
+        <path
+           d="m 650.31,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2224" />
+      </g>
+    </g>
+    <g
+       id="g2226" />
+    <g
+       id="g2228">
+      <g
+         id="g2230"
+         clip-path="url(#clipPath2234)">
+        <path
+           d="m 666.36,974.93 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2236" />
+        <path
+           d="m 666.36,962.57 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2238" />
+        <path
+           d="m 666.36,912.04 h 16.06"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2240" />
+        <path
+           d="m 667.09,763.46 0.07,0.76 0.09,-0.77 v 0 l 0.17,-4.09 h 0.07 l 0.03,0.61 h 0.06 0.03 0.07 0.01 0.01 v 0 0 h 0.01 v 0 0 h 0.02 0.02 0.01 0.02 0.01 l 0.1,0.98 h 0.05 l 0.08,-0.02 0.07,0.01 h 0.03 0.04 0.06 0.09 0.04 0.03 0.17 0.04 l 0.04,0.51 0.03,0.44 0.05,-0.95 h 0.09 0.19 0.12 v 0 h 0.03 0.03 0.04 v 0 l 0.06,-0.01 h 0.02 l 0.04,-0.65 h 0.15 l 0.16,0.03 0.02,0.03 0.28,0.32 0.23,-0.57 0.03,-0.04 h 0.09 0.01 0.07 l 0.11,3.26 0.2,-0.02 h 0.05 0.03 0.02 0.01 0.01 v 0 h 0.01 0.01 0.02 v 0 0 h 0.11 v 0 h 0.06 0.1 l 0.08,-0.1 0.02,-0.01 h 0.01 v 0 h 0.05 0.02 v 0 h 0.02 0.05 0.02 l 0.11,-0.28 0.04,0.28 v 0 h 0.01 l 0.02,0.47 0.12,-0.47 h 0.01 l 0.02,-0.18 0.01,-0.11 h 0.13 l 0.19,0.21 0.13,0.1 h 0.05 v 0 l 0.12,-0.49 h 0.06 l 0.11,-2.31 h 0.08 0.08 0.06 0.08 l 0.12,3.35 0.05,-1.04 v 0 l 0.05,0.09 h 0.01 0.21 0.26 0.06 0.09 l 0.1,0.19 0.22,0.42 0.06,-2.82 0.08,0.54 0.15,-0.31 0.13,-0.06 0.38,0.31 0.19,0.28 h 0.33 0.06 l 0.08,-1.59 h 0.03 0.11 0.1 l 0.13,0.3 0.36,0.99 0.12,1.44 0.03,0.03 0.19,0.21 h 0.02 0.04 l 0.26,0.13 0.52,0.33 0.11,0.06 0.36,0.42 0.04,3.17 0.07,3.6 h 0.01 v 0 l 0.18,-0.7 0.25,-0.89 0.05,-0.22 h 0.22 l 0.24,0.62 0.36,0.45 0.16,-0.99 0.05,-0.29 0.17,1.92 0.29,2.74 0.36,1.96 0.15,0.83 0.51,1.94 0.32,0.53 h 0.03 0.05 0.12 0.02 l 0.16,-0.52 0.02,2.84 h 0.04"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2242" />
+        <path
+           d="m 666.36,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2244" />
+      </g>
+    </g>
+    <g
+       id="g2246" />
+    <g
+       id="g2248">
+      <g
+         id="g2250"
+         clip-path="url(#clipPath2254)">
+        <path
+           d="m 682.42,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2256" />
+        <path
+           d="m 682.42,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2258" />
+        <path
+           d="m 682.42,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2260" />
+        <path
+           d="m 683.15,761.04 0.66,-1.15 0.67,-0.77 0.67,-0.42 0.22,-0.08 h 0.07 v 0 h 0.01 l 0.16,0.86 v 0 h 0.02 0.12 l 0.07,0.07 0.4,0.46 h 0.1 v 0 h 0.06 l 0.11,0.49 0.06,0.31 0.1,1.23 0.3,0.67 0.16,0.64 0.05,1.07 0.12,0.44 h 0.05 v 0 l 0.49,0.28 0.48,0.08 0.19,-0.12 0.67,-0.37 0.25,-0.13 h 0.07 v 0 h 0.03 0.03 0.01 l 0.05,0.11 h 0.01 v 0 h 0.01 v 0 0 0 h 0.01 v 0 0 h 0.01 0.01 v 0 h 0.02 0.04 0.01 0.03 0.08 0.03 v 0 h 0.02 0.14 l 0.06,-0.35 0.1,0.35 h 0.02 0.06 v 0 0 0 0 0 l 0.02,-4.82 h 0.04 0.18 0.04 0.25 0.09 0.03 l 0.02,-0.76 h 0.1 l 0.01,0.11 h 0.03 v 0 h 0.01 v 0 h 0.09 0.31 l 0.05,0.34 h 0.01 l 0.09,-0.51 0.03,-0.11 0.07,0.14 h 0.02 0.02 0.02 v 0 h 0.01 0.02 l 0.01,0.12 0.05,0.52 h 0.01 l 0.31,-0.43 0.13,0.08 h 0.03 v 0 l 0.09,3.55 h 0.03 v 0 h 0.02 v 0 h 0.05 l 0.25,2.29 0.37,0.01 0.67,-0.01 h 0.02 0.03 l 0.13,-0.49 h 0.13 l 0.2,-1.01 0.11,0.49 v 0 h 0.05 v 0 h 0.01 0.01 l 0.34,-1.22 0.24,8.68 0.07,6.57 0.21,2.3 h 0.01 0.07 v 0 h 0.37 0.1 0.01 0.01 l 0.03,-4.86 0.05,-3.21 0.05,0.37 v 0 h 0.04 0.09 0.01 v 0 0 h 0.01 v 0 h 0.01 0.01 0.25 0.1 0.02 v 0 l 0.03,-0.17 v 0 l 0.52,-0.35 0.44,-0.2 0.04,-2.54 h 0.08 v 0"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2262" />
+        <path
+           d="m 682.42,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2264" />
+      </g>
+    </g>
+    <g
+       id="g2266" />
+    <g
+       id="g2268">
+      <g
+         id="g2270"
+         clip-path="url(#clipPath2274)">
+        <path
+           d="m 698.47,974.93 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2276" />
+        <path
+           d="m 698.47,962.57 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2278" />
+        <path
+           d="m 698.47,912.04 h 16.05"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path2280" />
+        <path
+           d="m 699.2,757.76 h 0.09 0.03 0.01 0.04 0.03 0.1 0.05 v 0 h 0.03 0.11 0.08 0.13 0.07 0.06 0.04 0.03 0.01 0.24 v 0 h 0.05 0.17 0.11 0.06 0.14 0.1 0.14 0.07 0.01 0.24 0.03 0.03 0.14 0.03 0.11 0.07 0.01 0.03 0.02 0.01 0.02 0.33 0.3 v 0 h 0.01 0.06 0.02 0.04 0.13 0.05 0.08 0.06 0.02 0.02 0.07 0.01 0.05 0.04 0.03 0.01 0.02 0.04 0.04 0.01 0.04 0.01 0.18 v 0 h 0.04 0.16 v 0 h 0.16 0.12 v 0 h 0.02 0.02 0.02 v 0 h 0.05 0.09 0.01 0.28 0.16 0.22 0.08 0.24 0.02 0.03 v 0 0 h 0.01 v 0 h 0.01 v 0 h 0.01 0.01 0.15 0.07 0.14 0.06 v 0 0 h 0.12 v 0 h 0.07 0.03 v 0 0 0 h 0.01 v 0 0 0 h 0.1 0.14 0.06 0.08 0.03 0.01 0.05 0.01 v 0 0 h 0.05 0.34 0.09 v 0 h 0.07 0.07 v 0 0 h 0.1 0.01 0.04 0.05 0.06 0.04 0.13 0.05 0.06 0.05 0.07 0.01 0.04 0.01 0.02 0.01 0.04 0.07 0.06 v 0 h 0.02 0.04 0.06 0.01 0.01 0.01 0.01 0.01 0.17 0.04 0.29 0.1 0.04 0.08 v 0 h 0.02 0.01 0.23 0.19 0.01 0.05 0.02 0.1 0.02 0.12 0.02 0.24 0.24 0.15 0.04 v 0 h 0.04 0.01 0.07 0.15 0.01 0.04 0.02 0.05 0.02 0.07 0.09 0.06 0.05 0.04 0.01 0.05 0.04 0.04 0.01 0.06 0.02 0.16 0.23 0.09 0.04 0.02 0.01 v 0 h 0.01 0.02 0.04 0.03 v 0 h 0.02 0.09 0.09 0.02 0.03 0.03 0.03 0.27 0.02 0.02 0.03 0.01 0.02 0.02 0.03 0.01 0.01 0.04 0.01 0.03 0.02 0.05 0.02 0.02 0.01 0.07 0.02 0.01 0.07 0.01 0.02 0.12 0.08 0.08 0.21 0.06 0.03 0.01 0.02 0.04"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path2282" />
+        <path
+           d="m 698.47,746.9 h 16.05 v 238.89 h -16.05 z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path2284" />
+      </g>
+    </g>
+    <g
+       id="g2286" />
+    <g
+       id="g2288">
+      <g
+         id="g2290"
+         clip-path="url(#clipPath2294)" />
+    </g>
+    <g
+       id="g2296">
+      <g
+         id="g2298"
+         clip-path="url(#clipPath2302)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,398.17,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2306"><tspan
+             x="0"
+             y="0"
+             id="tspan2304">1</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2308">
+      <g
+         id="g2310"
+         clip-path="url(#clipPath2314)" />
+    </g>
+    <g
+       id="g2316">
+      <g
+         id="g2318"
+         clip-path="url(#clipPath2322)" />
+    </g>
+    <g
+       id="g2324" />
+    <g
+       id="g2326">
+      <g
+         id="g2328"
+         clip-path="url(#clipPath2332)" />
+    </g>
+    <g
+       id="g2334">
+      <g
+         id="g2336"
+         clip-path="url(#clipPath2340)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,414.22,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2344"><tspan
+             x="0"
+             y="0"
+             id="tspan2342">2</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2346">
+      <g
+         id="g2348"
+         clip-path="url(#clipPath2352)" />
+    </g>
+    <g
+       id="g2354">
+      <g
+         id="g2356"
+         clip-path="url(#clipPath2360)" />
+    </g>
+    <g
+       id="g2362" />
+    <g
+       id="g2364">
+      <g
+         id="g2366"
+         clip-path="url(#clipPath2370)" />
+    </g>
+    <g
+       id="g2372">
+      <g
+         id="g2374"
+         clip-path="url(#clipPath2378)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,430.27,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2382"><tspan
+             x="0"
+             y="0"
+             id="tspan2380">3</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2384">
+      <g
+         id="g2386"
+         clip-path="url(#clipPath2390)" />
+    </g>
+    <g
+       id="g2392">
+      <g
+         id="g2394"
+         clip-path="url(#clipPath2398)" />
+    </g>
+    <g
+       id="g2400" />
+    <g
+       id="g2402">
+      <g
+         id="g2404"
+         clip-path="url(#clipPath2408)" />
+    </g>
+    <g
+       id="g2410">
+      <g
+         id="g2412"
+         clip-path="url(#clipPath2416)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,446.32,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2420"><tspan
+             x="0"
+             y="0"
+             id="tspan2418">4</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2422">
+      <g
+         id="g2424"
+         clip-path="url(#clipPath2428)" />
+    </g>
+    <g
+       id="g2430">
+      <g
+         id="g2432"
+         clip-path="url(#clipPath2436)" />
+    </g>
+    <g
+       id="g2438" />
+    <g
+       id="g2440">
+      <g
+         id="g2442"
+         clip-path="url(#clipPath2446)" />
+    </g>
+    <g
+       id="g2448">
+      <g
+         id="g2450"
+         clip-path="url(#clipPath2454)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,462.38,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2458"><tspan
+             x="0"
+             y="0"
+             id="tspan2456">5</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2460">
+      <g
+         id="g2462"
+         clip-path="url(#clipPath2466)" />
+    </g>
+    <g
+       id="g2468">
+      <g
+         id="g2470"
+         clip-path="url(#clipPath2474)" />
+    </g>
+    <g
+       id="g2476" />
+    <g
+       id="g2478">
+      <g
+         id="g2480"
+         clip-path="url(#clipPath2484)" />
+    </g>
+    <g
+       id="g2486">
+      <g
+         id="g2488"
+         clip-path="url(#clipPath2492)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,478.43,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2496"><tspan
+             x="0"
+             y="0"
+             id="tspan2494">6</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2498">
+      <g
+         id="g2500"
+         clip-path="url(#clipPath2504)" />
+    </g>
+    <g
+       id="g2506">
+      <g
+         id="g2508"
+         clip-path="url(#clipPath2512)" />
+    </g>
+    <g
+       id="g2514" />
+    <g
+       id="g2516">
+      <g
+         id="g2518"
+         clip-path="url(#clipPath2522)" />
+    </g>
+    <g
+       id="g2524">
+      <g
+         id="g2526"
+         clip-path="url(#clipPath2530)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,494.48,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2534"><tspan
+             x="0"
+             y="0"
+             id="tspan2532">7</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2536">
+      <g
+         id="g2538"
+         clip-path="url(#clipPath2542)" />
+    </g>
+    <g
+       id="g2544">
+      <g
+         id="g2546"
+         clip-path="url(#clipPath2550)" />
+    </g>
+    <g
+       id="g2552" />
+    <g
+       id="g2554">
+      <g
+         id="g2556"
+         clip-path="url(#clipPath2560)" />
+    </g>
+    <g
+       id="g2562">
+      <g
+         id="g2564"
+         clip-path="url(#clipPath2568)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,510.53,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2572"><tspan
+             x="0"
+             y="0"
+             id="tspan2570">8</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2574">
+      <g
+         id="g2576"
+         clip-path="url(#clipPath2580)" />
+    </g>
+    <g
+       id="g2582">
+      <g
+         id="g2584"
+         clip-path="url(#clipPath2588)" />
+    </g>
+    <g
+       id="g2590" />
+    <g
+       id="g2592">
+      <g
+         id="g2594"
+         clip-path="url(#clipPath2598)" />
+    </g>
+    <g
+       id="g2600">
+      <g
+         id="g2602"
+         clip-path="url(#clipPath2606)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,526.58,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2610"><tspan
+             x="0"
+             y="0"
+             id="tspan2608">9</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2612">
+      <g
+         id="g2614"
+         clip-path="url(#clipPath2618)" />
+    </g>
+    <g
+       id="g2620">
+      <g
+         id="g2622"
+         clip-path="url(#clipPath2626)" />
+    </g>
+    <g
+       id="g2628" />
+    <g
+       id="g2630">
+      <g
+         id="g2632"
+         clip-path="url(#clipPath2636)" />
+    </g>
+    <g
+       id="g2638">
+      <g
+         id="g2640"
+         clip-path="url(#clipPath2644)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,539.3,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2648"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2646">10</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2650">
+      <g
+         id="g2652"
+         clip-path="url(#clipPath2656)" />
+    </g>
+    <g
+       id="g2658">
+      <g
+         id="g2660"
+         clip-path="url(#clipPath2664)" />
+    </g>
+    <g
+       id="g2666" />
+    <g
+       id="g2668">
+      <g
+         id="g2670"
+         clip-path="url(#clipPath2674)" />
+    </g>
+    <g
+       id="g2676">
+      <g
+         id="g2678"
+         clip-path="url(#clipPath2682)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,555.35,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2686"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2684">11</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2688">
+      <g
+         id="g2690"
+         clip-path="url(#clipPath2694)" />
+    </g>
+    <g
+       id="g2696">
+      <g
+         id="g2698"
+         clip-path="url(#clipPath2702)" />
+    </g>
+    <g
+       id="g2704" />
+    <g
+       id="g2706">
+      <g
+         id="g2708"
+         clip-path="url(#clipPath2712)" />
+    </g>
+    <g
+       id="g2714">
+      <g
+         id="g2716"
+         clip-path="url(#clipPath2720)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,571.4,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2724"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2722">12</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2726">
+      <g
+         id="g2728"
+         clip-path="url(#clipPath2732)" />
+    </g>
+    <g
+       id="g2734">
+      <g
+         id="g2736"
+         clip-path="url(#clipPath2740)" />
+    </g>
+    <g
+       id="g2742" />
+    <g
+       id="g2744">
+      <g
+         id="g2746"
+         clip-path="url(#clipPath2750)" />
+    </g>
+    <g
+       id="g2752">
+      <g
+         id="g2754"
+         clip-path="url(#clipPath2758)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,587.46,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2762"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2760">13</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2764">
+      <g
+         id="g2766"
+         clip-path="url(#clipPath2770)" />
+    </g>
+    <g
+       id="g2772">
+      <g
+         id="g2774"
+         clip-path="url(#clipPath2778)" />
+    </g>
+    <g
+       id="g2780" />
+    <g
+       id="g2782">
+      <g
+         id="g2784"
+         clip-path="url(#clipPath2788)" />
+    </g>
+    <g
+       id="g2790">
+      <g
+         id="g2792"
+         clip-path="url(#clipPath2796)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,603.51,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2800"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2798">14</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2802">
+      <g
+         id="g2804"
+         clip-path="url(#clipPath2808)" />
+    </g>
+    <g
+       id="g2810">
+      <g
+         id="g2812"
+         clip-path="url(#clipPath2816)" />
+    </g>
+    <g
+       id="g2818" />
+    <g
+       id="g2820">
+      <g
+         id="g2822"
+         clip-path="url(#clipPath2826)" />
+    </g>
+    <g
+       id="g2828">
+      <g
+         id="g2830"
+         clip-path="url(#clipPath2834)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,619.56,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2838"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2836">15</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2840">
+      <g
+         id="g2842"
+         clip-path="url(#clipPath2846)" />
+    </g>
+    <g
+       id="g2848">
+      <g
+         id="g2850"
+         clip-path="url(#clipPath2854)" />
+    </g>
+    <g
+       id="g2856" />
+    <g
+       id="g2858">
+      <g
+         id="g2860"
+         clip-path="url(#clipPath2864)" />
+    </g>
+    <g
+       id="g2866">
+      <g
+         id="g2868"
+         clip-path="url(#clipPath2872)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,635.61,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2876"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2874">16</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2878">
+      <g
+         id="g2880"
+         clip-path="url(#clipPath2884)" />
+    </g>
+    <g
+       id="g2886">
+      <g
+         id="g2888"
+         clip-path="url(#clipPath2892)" />
+    </g>
+    <g
+       id="g2894" />
+    <g
+       id="g2896">
+      <g
+         id="g2898"
+         clip-path="url(#clipPath2902)" />
+    </g>
+    <g
+       id="g2904">
+      <g
+         id="g2906"
+         clip-path="url(#clipPath2910)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,651.67,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2914"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2912">17</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2916">
+      <g
+         id="g2918"
+         clip-path="url(#clipPath2922)" />
+    </g>
+    <g
+       id="g2924">
+      <g
+         id="g2926"
+         clip-path="url(#clipPath2930)" />
+    </g>
+    <g
+       id="g2932" />
+    <g
+       id="g2934">
+      <g
+         id="g2936"
+         clip-path="url(#clipPath2940)" />
+    </g>
+    <g
+       id="g2942">
+      <g
+         id="g2944"
+         clip-path="url(#clipPath2948)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,667.72,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2952"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2950">18</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2954">
+      <g
+         id="g2956"
+         clip-path="url(#clipPath2960)" />
+    </g>
+    <g
+       id="g2962">
+      <g
+         id="g2964"
+         clip-path="url(#clipPath2968)" />
+    </g>
+    <g
+       id="g2970" />
+    <g
+       id="g2972">
+      <g
+         id="g2974"
+         clip-path="url(#clipPath2978)" />
+    </g>
+    <g
+       id="g2980">
+      <g
+         id="g2982"
+         clip-path="url(#clipPath2986)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,683.77,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text2990"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan2988">19</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g2992">
+      <g
+         id="g2994"
+         clip-path="url(#clipPath2998)" />
+    </g>
+    <g
+       id="g3000">
+      <g
+         id="g3002"
+         clip-path="url(#clipPath3006)" />
+    </g>
+    <g
+       id="g3008" />
+    <g
+       id="g3010">
+      <g
+         id="g3012"
+         clip-path="url(#clipPath3016)" />
+    </g>
+    <g
+       id="g3018">
+      <g
+         id="g3020"
+         clip-path="url(#clipPath3024)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,702.49,732.58)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#1a1a1a;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text3028"><tspan
+             x="0"
+             y="0"
+             id="tspan3026">X</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g3030">
+      <g
+         id="g3032"
+         clip-path="url(#clipPath3036)" />
+    </g>
+    <g
+       id="g3038">
+      <g
+         id="g3040"
+         clip-path="url(#clipPath3044)" />
+    </g>
+    <g
+       id="g3046" />
+    <g
+       id="g3048" />
+    <g
+       id="g3050" />
+    <g
+       id="g3052" />
+    <g
+       id="g3054" />
+    <g
+       id="g3056" />
+    <g
+       id="g3058" />
+    <g
+       id="g3060" />
+    <g
+       id="g3062" />
+    <g
+       id="g3064" />
+    <g
+       id="g3066" />
+    <g
+       id="g3068" />
+    <g
+       id="g3070" />
+    <g
+       id="g3072" />
+    <g
+       id="g3074" />
+    <g
+       id="g3076" />
+    <g
+       id="g3078" />
+    <g
+       id="g3080" />
+    <g
+       id="g3082" />
+    <g
+       id="g3084" />
+    <g
+       id="g3086" />
+    <g
+       id="g3088" />
+    <g
+       id="g3090" />
+    <g
+       id="g3092" />
+    <g
+       id="g3094" />
+    <g
+       id="g3096" />
+    <g
+       id="g3098" />
+    <g
+       id="g3100" />
+    <g
+       id="g3102" />
+    <g
+       id="g3104" />
+    <g
+       id="g3106" />
+    <g
+       id="g3108" />
+    <g
+       id="g3110" />
+    <g
+       id="g3112" />
+    <g
+       id="g3114" />
+    <g
+       id="g3116" />
+    <g
+       id="g3118" />
+    <g
+       id="g3120" />
+    <g
+       id="g3122" />
+    <g
+       id="g3124" />
+    <g
+       id="g3126" />
+    <g
+       id="g3128" />
+    <g
+       id="g3130" />
+    <g
+       id="g3132" />
+    <g
+       id="g3134" />
+    <g
+       id="g3136" />
+    <g
+       id="g3138" />
+    <g
+       id="g3140" />
+    <g
+       id="g3142" />
+    <g
+       id="g3144" />
+    <g
+       id="g3146" />
+    <g
+       id="g3148" />
+    <g
+       id="g3150" />
+    <g
+       id="g3152" />
+    <g
+       id="g3154" />
+    <g
+       id="g3156" />
+    <g
+       id="g3158" />
+    <g
+       id="g3160" />
+    <g
+       id="g3162" />
+    <g
+       id="g3164" />
+    <g
+       id="g3166" />
+    <g
+       id="g3168" />
+    <g
+       id="g3170" />
+    <g
+       id="g3172" />
+    <g
+       id="g3174" />
+    <g
+       id="g3176" />
+    <g
+       id="g3178" />
+    <g
+       id="g3180" />
+    <g
+       id="g3182" />
+    <g
+       id="g3184" />
+    <g
+       id="g3186" />
+    <g
+       id="g3188" />
+    <g
+       id="g3190" />
+    <g
+       id="g3192" />
+    <g
+       id="g3194" />
+    <g
+       id="g3196" />
+    <g
+       id="g3198" />
+    <g
+       id="g3200" />
+    <g
+       id="g3202" />
+    <g
+       id="g3204" />
+    <g
+       id="g3206" />
+    <g
+       id="g3208" />
+    <g
+       id="g3210" />
+    <g
+       id="g3212" />
+    <g
+       id="g3214" />
+    <g
+       id="g3216" />
+    <g
+       id="g3218" />
+    <g
+       id="g3220" />
+    <g
+       id="g3222" />
+    <g
+       id="g3224" />
+    <g
+       id="g3226" />
+    <g
+       id="g3228" />
+    <g
+       id="g3230" />
+    <g
+       id="g3232" />
+    <g
+       id="g3234" />
+    <g
+       id="g3236" />
+    <g
+       id="g3238" />
+    <g
+       id="g3240" />
+    <g
+       id="g3242" />
+    <g
+       id="g3244" />
+    <g
+       id="g3246" />
+    <g
+       id="g3248" />
+    <g
+       id="g3250" />
+    <g
+       id="g3252" />
+    <g
+       id="g3254" />
+    <g
+       id="g3256" />
+    <g
+       id="g3258" />
+    <g
+       id="g3260" />
+    <g
+       id="g3262" />
+    <g
+       id="g3264" />
+    <g
+       id="g3266" />
+    <g
+       id="g3268" />
+    <g
+       id="g3270" />
+    <g
+       id="g3272" />
+    <g
+       id="g3274" />
+    <g
+       id="g3276" />
+    <g
+       id="g3278" />
+    <g
+       id="g3280" />
+    <g
+       id="g3282" />
+    <g
+       id="g3284" />
+    <g
+       id="g3286" />
+    <g
+       id="g3288" />
+    <g
+       id="g3290" />
+    <g
+       id="g3292" />
+    <g
+       id="g3294" />
+    <g
+       id="g3296" />
+    <g
+       id="g3298" />
+    <g
+       id="g3300" />
+    <g
+       id="g3302" />
+    <g
+       id="g3304" />
+    <g
+       id="g3306" />
+    <g
+       id="g3308" />
+    <g
+       id="g3310" />
+    <g
+       id="g3312" />
+    <g
+       id="g3314" />
+    <g
+       id="g3316" />
+    <g
+       id="g3318" />
+    <g
+       id="g3320" />
+    <g
+       id="g3322" />
+    <g
+       id="g3324" />
+    <g
+       id="g3326" />
+    <g
+       id="g3328" />
+    <g
+       id="g3330" />
+    <g
+       id="g3332" />
+    <g
+       id="g3334" />
+    <g
+       id="g3336" />
+    <g
+       id="g3338" />
+    <g
+       id="g3340" />
+    <g
+       id="g3342" />
+    <g
+       id="g3344" />
+    <g
+       id="g3346" />
+    <g
+       id="g3348" />
+    <g
+       id="g3350" />
+    <g
+       id="g3352" />
+    <g
+       id="g3354" />
+    <g
+       id="g3356" />
+    <g
+       id="g3358" />
+    <g
+       id="g3360" />
+    <g
+       id="g3362" />
+    <g
+       id="g3364" />
+    <g
+       id="g3366" />
+    <g
+       id="g3368" />
+    <g
+       id="g3370" />
+    <g
+       id="g3372" />
+    <g
+       id="g3374" />
+    <g
+       id="g3376" />
+    <g
+       id="g3378" />
+    <g
+       id="g3380" />
+    <g
+       id="g3382" />
+    <g
+       id="g3384" />
+    <g
+       id="g3386" />
+    <g
+       id="g3388" />
+    <g
+       id="g3390" />
+    <g
+       id="g3392" />
+    <g
+       id="g3394" />
+    <g
+       id="g3396" />
+    <g
+       id="g3398" />
+    <g
+       id="g3400" />
+    <g
+       id="g3402" />
+    <g
+       id="g3404" />
+    <g
+       id="g3406" />
+    <g
+       id="g3408" />
+    <g
+       id="g3410" />
+    <g
+       id="g3412" />
+    <g
+       id="g3414" />
+    <g
+       id="g3416" />
+    <g
+       id="g3418" />
+    <g
+       id="g3420" />
+    <g
+       id="g3422" />
+    <g
+       id="g3424" />
+    <g
+       id="g3426" />
+    <g
+       id="g3428" />
+    <g
+       id="g3430" />
+    <g
+       id="g3432" />
+    <g
+       id="g3434" />
+    <g
+       id="g3436" />
+    <g
+       id="g3438" />
+    <g
+       id="g3440" />
+    <g
+       id="g3442" />
+    <g
+       id="g3444" />
+    <g
+       id="g3446" />
+    <g
+       id="g3448" />
+    <g
+       id="g3450" />
+    <g
+       id="g3452" />
+    <g
+       id="g3454" />
+    <g
+       id="g3456" />
+    <g
+       id="g3458" />
+    <g
+       id="g3460" />
+    <g
+       id="g3462" />
+    <g
+       id="g3464" />
+    <g
+       id="g3466" />
+    <g
+       id="g3468" />
+    <g
+       id="g3470" />
+    <g
+       id="g3472" />
+    <g
+       id="g3474" />
+    <g
+       id="g3476" />
+    <g
+       id="g3478" />
+    <g
+       id="g3480" />
+    <g
+       id="g3482" />
+    <g
+       id="g3484" />
+    <g
+       id="g3486" />
+    <g
+       id="g3488" />
+    <g
+       id="g3490" />
+    <g
+       id="g3492">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,383.54,754.53)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3496"><tspan
+           x="0"
+           y="0"
+           id="tspan3494">0</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,383.54,827.29)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3500"><tspan
+           x="0"
+           y="0"
+           id="tspan3498">5</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,378.54,900.05)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3504"><tspan
+           x="0 5.0040002"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3502">10</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,378.54,972.82)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3508"><tspan
+           x="0 5.0040002"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3506">15</tspan></text>
+    </g>
+    <g
+       id="g3510" />
+    <g
+       id="g3512" />
+    <g
+       id="g3514" />
+    <g
+       id="g3516" />
+    <g
+       id="g3518" />
+    <g
+       id="g3520" />
+    <g
+       id="g3522" />
+    <g
+       id="g3524" />
+    <g
+       id="g3526" />
+    <g
+       id="g3528" />
+    <g
+       id="g3530" />
+    <g
+       id="g3532" />
+    <g
+       id="g3534" />
+    <g
+       id="g3536" />
+    <g
+       id="g3538" />
+    <g
+       id="g3540" />
+    <g
+       id="g3542" />
+    <g
+       id="g3544" />
+    <g
+       id="g3546" />
+    <g
+       id="g3548" />
+    <g
+       id="g3550" />
+    <g
+       id="g3552" />
+    <g
+       id="g3554" />
+    <g
+       id="g3556" />
+    <g
+       id="g3558" />
+    <g
+       id="g3560" />
+    <g
+       id="g3562" />
+    <g
+       id="g3564" />
+    <g
+       id="g3566" />
+    <g
+       id="g3568" />
+    <g
+       id="g3570" />
+    <g
+       id="g3572" />
+    <g
+       id="g3574" />
+    <g
+       id="g3576" />
+    <g
+       id="g3578" />
+    <g
+       id="g3580" />
+    <g
+       id="g3582" />
+    <g
+       id="g3584" />
+    <g
+       id="g3586" />
+    <g
+       id="g3588" />
+    <g
+       id="g3590" />
+    <g
+       id="g3592" />
+    <g
+       id="g3594" />
+    <g
+       id="g3596" />
+    <g
+       id="g3598" />
+    <g
+       id="g3600" />
+    <g
+       id="g3602" />
+    <g
+       id="g3604">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,520.99,713.5)"
+         style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3608"><tspan
+           x="0 7.9419999 14.058 17.721001 23.837 33 39.116001 44.616001 50.731998 59.895"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3606">Chromosome</tspan></text>
+    </g>
+    <g
+       id="g3610" />
+    <g
+       id="g3612">
+      <text
+         xml:space="preserve"
+         transform="matrix(0,1,1,0,373.38,840.06)"
+         style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3616"><tspan
+           x="0 6.1160002 14.674 22.615999 25.674 31.174 36.674 42.790001 46.452999"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3614">LOD score</tspan></text>
+    </g>
+    <g
+       id="g3618" />
+    <g
+       id="g3620" />
+    <g
+       id="g3622" />
+    <g
+       id="g3624" />
+    <g
+       id="g3626" />
+    <g
+       id="g3628">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,535.99,993.9)"
+         style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3632"><tspan
+           x="0 8.6639996 15.336 19.332001 26.004 29.34"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3630">Data 3</tspan></text>
+    </g>
+    <g
+       id="g3634" />
+    <g
+       id="g3636" />
+    <g
+       id="g3638" />
+    <g
+       id="g3640" />
+    <g
+       id="g3642" />
+    <g
+       id="g3644" />
+    <g
+       id="g3646" />
+    <g
+       id="g3648" />
+    <g
+       id="g3650" />
+    <g
+       id="g3652" />
+    <g
+       id="g3654" />
+    <g
+       id="g3656" />
+    <g
+       id="g3658" />
+    <g
+       id="g3660" />
+    <g
+       id="g3662">
+      <g
+         id="g3664"
+         clip-path="url(#clipPath3668)" />
+    </g>
+    <g
+       id="g3670" />
+    <g
+       id="g3672">
+      <g
+         id="g3674"
+         clip-path="url(#clipPath3678)">
+        <path
+           d="M 33.48,621.22 H 210.52"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3680" />
+        <path
+           d="M 33.48,614.11 H 210.52"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path3682" />
+        <path
+           d="M 33.48,561.25 H 210.52"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path3684" />
+        <path
+           d="m 44.03,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3686" />
+        <path
+           d="m 60.13,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3688" />
+        <path
+           d="m 60.76,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3690" />
+        <path
+           d="m 64.6,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3692" />
+        <path
+           d="m 67.35,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3694" />
+        <path
+           d="m 76.22,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3696" />
+        <path
+           d="m 87.75,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3698" />
+        <path
+           d="m 92.32,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3700" />
+        <path
+           d="m 95.7,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3702" />
+        <path
+           d="m 100.48,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3704" />
+        <path
+           d="m 103.99,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3706" />
+        <path
+           d="m 108.41,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3708" />
+        <path
+           d="m 114.51,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3710" />
+        <path
+           d="m 119.79,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3712" />
+        <path
+           d="m 124.51,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3714" />
+        <path
+           d="m 125.88,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3716" />
+        <path
+           d="m 132.49,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3718" />
+        <path
+           d="m 134,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3720" />
+        <path
+           d="m 140.03,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3722" />
+        <path
+           d="m 140.6,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3724" />
+        <path
+           d="m 148.62,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3726" />
+        <path
+           d="m 156.7,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3728" />
+        <path
+           d="m 160.5,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3730" />
+        <path
+           d="m 160.59,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3732" />
+        <path
+           d="m 168.4,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3734" />
+        <path
+           d="m 168.95,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3736" />
+        <path
+           d="m 169.51,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3738" />
+        <path
+           d="m 170.21,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3740" />
+        <path
+           d="m 171.42,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3742" />
+        <path
+           d="m 172.79,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3744" />
+        <path
+           d="m 174.65,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3746" />
+        <path
+           d="m 177.65,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3748" />
+        <path
+           d="m 178.22,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3750" />
+        <path
+           d="m 178.22,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3752" />
+        <path
+           d="m 178.74,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3754" />
+        <path
+           d="m 180.48,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3756" />
+        <path
+           d="m 182.9,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3758" />
+        <path
+           d="m 185.32,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3760" />
+        <path
+           d="m 188.89,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3762" />
+        <path
+           d="m 191.38,374.08 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3764" />
+        <path
+           d="m 44.03,386.22 16.1,1.02 0.63,0.04 3.84,0.51 2.75,-1.5 8.87,-0.4 11.53,1.47 4.57,-0.61 3.38,-0.49 4.78,-0.39 3.51,0.03 4.42,0.02 6.1,173.4 5.28,-173.44 4.72,0.12 1.37,0.04 6.61,0.28 1.51,1.18 6.03,-1.31 0.57,-0.01 8.02,-0.33 h 8.08 3.8 0.09 l 7.81,0.03 0.55,1.19 0.56,-1.05 0.7,0.16 1.21,0.01 1.37,0.48 1.86,0.89 3,-0.41 0.57,-0.05 v 0 l 0.52,-1.21 1.74,-0.04 h 2.42 l 2.42,0.24 3.57,-0.22 2.49,0.2"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path3766" />
+        <path
+           d="M 33.48,374.08 H 210.52 V 632.99 H 33.48 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3768" />
+      </g>
+    </g>
+    <g
+       id="g3770" />
+    <g
+       id="g3772">
+      <g
+         id="g3774"
+         clip-path="url(#clipPath3778)" />
+    </g>
+    <g
+       id="g3780" />
+    <g
+       id="g3782" />
+    <g
+       id="g3784" />
+    <g
+       id="g3786" />
+    <g
+       id="g3788" />
+    <g
+       id="g3790" />
+    <g
+       id="g3792" />
+    <g
+       id="g3794" />
+    <g
+       id="g3796" />
+    <g
+       id="g3798" />
+    <g
+       id="g3800" />
+    <g
+       id="g3802" />
+    <g
+       id="g3804" />
+    <g
+       id="g3806" />
+    <g
+       id="g3808">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,382.61)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3812"><tspan
+           x="0"
+           y="0"
+           id="tspan3810">0</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,443.29)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3816"><tspan
+           x="0"
+           y="0"
+           id="tspan3814">5</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,18.54,503.97)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3820"><tspan
+           x="0 5.0040002"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3818">10</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,18.54,564.65)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3824"><tspan
+           x="0 5.0040002"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3822">15</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,18.54,625.32)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3828"><tspan
+           x="0 5.0040002"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3826">20</tspan></text>
+    </g>
+    <g
+       id="g3830" />
+    <g
+       id="g3832" />
+    <g
+       id="g3834" />
+    <g
+       id="g3836" />
+    <g
+       id="g3838" />
+    <g
+       id="g3840" />
+    <g
+       id="g3842" />
+    <g
+       id="g3844" />
+    <g
+       id="g3846" />
+    <g
+       id="g3848">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,90.19,360.7)"
+         style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3852"><tspan
+           x="0 6.7870002 12.903 18.403 20.844999 23.903 26.344999 32.460999 38.577 41.634998 45.298 50.798 59.960999"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3850">Position (cM)</tspan></text>
+    </g>
+    <g
+       id="g3854" />
+    <g
+       id="g3856">
+      <text
+         xml:space="preserve"
+         transform="matrix(0,1,1,0,13.38,477.25)"
+         style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3860"><tspan
+           x="0 6.1160002 14.674 22.615999 25.674 31.174 36.674 42.790001 46.452999"
+           y="0"
+           sodipodi:role="line"
+           id="tspan3858">LOD score</tspan></text>
+    </g>
+    <g
+       id="g3862" />
+    <g
+       id="g3864" />
+    <g
+       id="g3866" />
+    <g
+       id="g3868" />
+    <g
+       id="g3870" />
+    <g
+       id="g3872">
+      <text
+         xml:space="preserve"
+         transform="scale(1,-1)"
+         style="font-style:normal;font-variant:normal;font-weight:normal;font-stretch:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:'Helvetica, Normal';font-variant-ligatures:normal;font-variant-caps:normal;font-variant-numeric:normal;font-variant-east-asian:normal;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3876"
+         x="102.98"
+         y="-641.09998"><tspan
+           sodipodi:role="line"
+           id="tspan5777"
+           x="102.98"
+           y="-641.09998">Peak 1</tspan><tspan
+           sodipodi:role="line"
+           id="tspan5779"
+           x="102.98"
+           y="-626.09998"></tspan></text>
+      <text
+         xml:space="preserve"
+         transform="scale(1,-1)"
+         style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3876-3"
+         x="33.237152"
+         y="-670.2655"><tspan
+           x="33.237152"
+           y="-670.2655"
+           sodipodi:role="line"
+           id="tspan3874-6">Case 1: one marker (peaks 1 and 2)</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="scale(1,-1)"
+         style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3876-3-2"
+         x="41.55146"
+         y="-316.63177"><tspan
+           x="41.55146"
+           y="-316.63177"
+           sodipodi:role="line"
+           id="tspan3874-6-3">Case 2: one-several pseudomarker(s) (peaks 3 and 4)</tspan></text>
+    </g>
+    <g
+       id="g3878" />
+    <g
+       id="g3880" />
+    <g
+       id="g3882" />
+    <g
+       id="g3884" />
+    <g
+       id="g3886" />
+    <g
+       id="g3888" />
+    <g
+       id="g3890" />
+    <g
+       id="g3892" />
+    <g
+       id="g3894"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3896"
+         clip-path="url(#clipPath3900)">
+        <path
+           d="m 267.31,495.36 h 107.37 v 37.23 H 267.31 Z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3902" />
+      </g>
+    </g>
+    <g
+       id="g3904" />
+    <g
+       id="g3906"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3908"
+         clip-path="url(#clipPath3912)">
+        <path
+           d="m 374.68,495.36 h 29.89 v 37.23 h -29.89 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3914" />
+      </g>
+    </g>
+    <g
+       id="g3916" />
+    <g
+       id="g3918"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3920"
+         clip-path="url(#clipPath3924)">
+        <path
+           d="m 404.57,495.36 h 48.03 v 37.23 h -48.03 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3926" />
+      </g>
+    </g>
+    <g
+       id="g3928" />
+    <g
+       id="g3930"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3932"
+         clip-path="url(#clipPath3936)">
+        <path
+           d="m 452.61,495.36 h 41.36 v 37.23 h -41.36 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3938" />
+      </g>
+    </g>
+    <g
+       id="g3940" />
+    <g
+       id="g3942"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3944"
+         clip-path="url(#clipPath3948)">
+        <path
+           d="m 493.97,495.36 h 41.36 v 37.23 h -41.36 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3950" />
+      </g>
+    </g>
+    <g
+       id="g3952" />
+    <g
+       id="g3954"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3956"
+         clip-path="url(#clipPath3960)">
+        <path
+           d="M 535.33,495.36 H 572 v 37.23 h -36.67 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3962" />
+      </g>
+    </g>
+    <g
+       id="g3964" />
+    <g
+       id="g3966"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3968"
+         clip-path="url(#clipPath3972)">
+        <path
+           d="m 572,495.36 h 36.67 v 37.23 H 572 Z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3974" />
+      </g>
+    </g>
+    <g
+       id="g3976" />
+    <g
+       id="g3978"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3980"
+         clip-path="url(#clipPath3984)">
+        <path
+           d="m 608.67,495.36 h 31.35 v 37.23 h -31.35 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3986" />
+      </g>
+    </g>
+    <g
+       id="g3988" />
+    <g
+       id="g3990"
+       transform="translate(0,100.40027)">
+      <g
+         id="g3992"
+         clip-path="url(#clipPath3996)">
+        <path
+           d="m 640.03,495.36 h 28.67 v 37.23 h -28.67 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path3998" />
+      </g>
+    </g>
+    <g
+       id="g4000" />
+    <g
+       id="g4002"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4004"
+         clip-path="url(#clipPath4008)">
+        <path
+           d="m 267.31,475.41 h 107.37 v 19.95 H 267.31 Z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4010" />
+      </g>
+    </g>
+    <g
+       id="g4012" />
+    <g
+       id="g4014"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4016"
+         clip-path="url(#clipPath4020)">
+        <path
+           d="m 374.68,475.41 h 29.89 v 19.95 h -29.89 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4022" />
+      </g>
+    </g>
+    <g
+       id="g4024" />
+    <g
+       id="g4026"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4028"
+         clip-path="url(#clipPath4032)">
+        <path
+           d="m 404.57,475.41 h 48.03 v 19.95 h -48.03 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4034" />
+      </g>
+    </g>
+    <g
+       id="g4036" />
+    <g
+       id="g4038"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4040"
+         clip-path="url(#clipPath4044)">
+        <path
+           d="m 452.61,475.41 h 41.36 v 19.95 h -41.36 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4046" />
+      </g>
+    </g>
+    <g
+       id="g4048" />
+    <g
+       id="g4050"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4052"
+         clip-path="url(#clipPath4056)">
+        <path
+           d="m 493.97,475.41 h 41.36 v 19.95 h -41.36 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4058" />
+      </g>
+    </g>
+    <g
+       id="g4060" />
+    <g
+       id="g4062"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4064"
+         clip-path="url(#clipPath4068)">
+        <path
+           d="M 535.33,475.41 H 572 v 19.95 h -36.67 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4070" />
+      </g>
+    </g>
+    <g
+       id="g4072" />
+    <g
+       id="g4074"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4076"
+         clip-path="url(#clipPath4080)">
+        <path
+           d="m 572,475.41 h 36.67 v 19.95 H 572 Z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4082" />
+      </g>
+    </g>
+    <g
+       id="g4084" />
+    <g
+       id="g4086"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4088"
+         clip-path="url(#clipPath4092)">
+        <path
+           d="m 608.67,475.41 h 31.35 v 19.95 h -31.35 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4094" />
+      </g>
+    </g>
+    <g
+       id="g4096" />
+    <g
+       id="g4098"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4100"
+         clip-path="url(#clipPath4104)">
+        <path
+           d="m 640.03,475.41 h 28.67 v 19.95 h -28.67 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4106" />
+      </g>
+    </g>
+    <g
+       id="g4108" />
+    <g
+       id="g4110"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4112"
+         clip-path="url(#clipPath4116)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,300.98,509.67)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4120"><tspan
+             x="0 10.668 17.34 22.007999 28.68 35.352001"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4118">marker</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4122" />
+    <g
+       id="g4124"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4126"
+         clip-path="url(#clipPath4130)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,272.98,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4134"><tspan
+             x="0 9.9960003 18.66 27.323999 35.987999 42.66 49.332001 56.004002 62.675999 69.348 76.019997 82.692001 89.363998"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4132">mUNC050096588</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4136" />
+    <g
+       id="g4138"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4140"
+         clip-path="url(#clipPath4144)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,380.35,509.67)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4148"><tspan
+             x="0 6.552 13.884"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4146">chr</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4150" />
+    <g
+       id="g4152"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4154"
+         clip-path="url(#clipPath4158)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,386.29,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4162"><tspan
+             x="0"
+             y="0"
+             id="tspan4160">5</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4164" />
+    <g
+       id="g4166"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4168"
+         clip-path="url(#clipPath4172)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,417.92,509.67)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4176"><tspan
+             x="0 7.3319998 14.664"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4174">pos</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4178" />
+    <g
+       id="g4180"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4182"
+         clip-path="url(#clipPath4186)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,410.24,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4190"><tspan
+             x="0 6.6719999 13.344 16.68 23.351999 30.024"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4188">24.069</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4192" />
+    <g
+       id="g4194"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4196"
+         clip-path="url(#clipPath4200)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,458.28,518.31)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4204"><tspan
+             x="0 6.6719999 10.008 13.344 20.016001 23.351999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4202">allele</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,469.95,501.03)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4208"><tspan
+             x="0"
+             y="0"
+             id="tspan4206">1</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4210" />
+    <g
+       id="g4212"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4214"
+         clip-path="url(#clipPath4218)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,469.29,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4222"><tspan
+             x="0"
+             y="0"
+             id="tspan4220">A</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4224" />
+    <g
+       id="g4226"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4228"
+         clip-path="url(#clipPath4232)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,499.64,518.31)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4236"><tspan
+             x="0 6.6719999 10.008 13.344 20.016001 23.351999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4234">allele</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,511.31,501.03)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4240"><tspan
+             x="0"
+             y="0"
+             id="tspan4238">2</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4242" />
+    <g
+       id="g4244"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4246"
+         clip-path="url(#clipPath4250)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,509.98,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4254"><tspan
+             x="0"
+             y="0"
+             id="tspan4252">G</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4256" />
+    <g
+       id="g4258"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4260"
+         clip-path="url(#clipPath4264)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,550,518.31)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4268"><tspan
+             x="0"
+             y="0"
+             id="tspan4266">n</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,541,501.03)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4272"><tspan
+             x="0 8.6639996 18.66"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4270">HM1</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4274" />
+    <g
+       id="g4276"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4278"
+         clip-path="url(#clipPath4282)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,550.33,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4286"><tspan
+             x="0"
+             y="0"
+             id="tspan4284">0</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4288" />
+    <g
+       id="g4290"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4292"
+         clip-path="url(#clipPath4296)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,586.67,518.31)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4300"><tspan
+             x="0"
+             y="0"
+             id="tspan4298">n</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,577.67,501.03)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4304"><tspan
+             x="0 8.6639996 18.66"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4302">HM2</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4306" />
+    <g
+       id="g4308"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4310"
+         clip-path="url(#clipPath4314)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,587,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4318"><tspan
+             x="0"
+             y="0"
+             id="tspan4316">0</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4320" />
+    <g
+       id="g4322"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4324"
+         clip-path="url(#clipPath4328)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,620.68,518.31)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4332"><tspan
+             x="0"
+             y="0"
+             id="tspan4330">n</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,616.35,501.03)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4336"><tspan
+             x="0 8.6639996"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4334">HT</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4338" />
+    <g
+       id="g4340"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4342"
+         clip-path="url(#clipPath4346)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,614.34,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4350"><tspan
+             x="0 6.6719999 13.344"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4348">176</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4352" />
+    <g
+       id="g4354"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4356"
+         clip-path="url(#clipPath4360)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,650.69,518.31)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4364"><tspan
+             x="0"
+             y="0"
+             id="tspan4362">n</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,645.7,501.03)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4368"><tspan
+             x="0 8.6639996"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4366">NA</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4370" />
+    <g
+       id="g4372"
+       transform="translate(0,100.40027)">
+      <g
+         id="g4374"
+         clip-path="url(#clipPath4378)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,651.02,481.07)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4382"><tspan
+             x="0"
+             y="0"
+             id="tspan4380">0</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4384" />
+    <g
+       id="g4386" />
+    <g
+       id="g4388" />
+    <g
+       id="g4390" />
+    <g
+       id="g4392" />
+    <g
+       id="g4394" />
+    <g
+       id="g4396" />
+    <g
+       id="g4398" />
+    <g
+       id="g4400" />
+    <g
+       id="g4402" />
+    <g
+       id="g4404">
+      <g
+         id="g4406"
+         clip-path="url(#clipPath4410)" />
+    </g>
+    <g
+       id="g4412" />
+    <g
+       id="g4414">
+      <g
+         id="g4416"
+         clip-path="url(#clipPath4420)">
+        <path
+           d="M 40.98,268.42 H 210.52"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4422" />
+        <path
+           d="M 40.98,241.01 H 210.52"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:2.13, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path4424" />
+        <path
+           d="M 40.98,152.56 H 210.52"
+           style="fill:none;stroke:#000000;stroke-width:1.07;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:4.27, 2.13;stroke-dashoffset:0;stroke-opacity:1"
+           id="path4426" />
+        <path
+           d="m 51.02,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4428" />
+        <path
+           d="m 54.62,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4430" />
+        <path
+           d="m 59.2,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4432" />
+        <path
+           d="m 70.83,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4434" />
+        <path
+           d="m 74.61,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4436" />
+        <path
+           d="m 83.14,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4438" />
+        <path
+           d="m 85.04,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4440" />
+        <path
+           d="m 86.94,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4442" />
+        <path
+           d="m 88.53,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4444" />
+        <path
+           d="m 90.03,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4446" />
+        <path
+           d="m 103.87,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4448" />
+        <path
+           d="m 104.81,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4450" />
+        <path
+           d="m 105.44,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4452" />
+        <path
+           d="m 107.67,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4454" />
+        <path
+           d="m 114.99,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4456" />
+        <path
+           d="m 117.41,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4458" />
+        <path
+           d="m 120.85,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4460" />
+        <path
+           d="m 130.05,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4462" />
+        <path
+           d="m 136.26,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4464" />
+        <path
+           d="m 138.97,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4466" />
+        <path
+           d="m 144.99,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4468" />
+        <path
+           d="m 145.06,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4470" />
+        <path
+           d="m 145.23,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4472" />
+        <path
+           d="m 146.04,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4474" />
+        <path
+           d="m 146.29,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4476" />
+        <path
+           d="m 148.66,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4478" />
+        <path
+           d="m 151.68,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4480" />
+        <path
+           d="m 152.23,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4482" />
+        <path
+           d="m 152.39,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4484" />
+        <path
+           d="m 155.74,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4486" />
+        <path
+           d="m 160.13,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4488" />
+        <path
+           d="m 160.17,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4490" />
+        <path
+           d="m 162.4,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4492" />
+        <path
+           d="m 162.64,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4494" />
+        <path
+           d="m 163.28,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4496" />
+        <path
+           d="m 167.09,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4498" />
+        <path
+           d="m 174.56,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4500" />
+        <path
+           d="m 180.83,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4502" />
+        <path
+           d="m 182.5,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4504" />
+        <path
+           d="m 197.91,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4506" />
+        <path
+           d="m 202.67,21.28 v 7.76"
+           style="fill:none;stroke:#000000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4508" />
+        <path
+           d="m 51.02,40.87 3.6,-4.56 4.58,-0.57 11.63,-1.51 3.78,0.35 8.53,1.41 h 1.9 1.9 l 1.59,12.36 1.5,0.36 13.84,-1.34 0.94,-7.61 0.63,-3.23 2.23,-2.71 7.32,6.95 2.42,7.8 3.44,156.79 9.2,-164.6 6.21,-2.47 2.71,-1.08 h 6.02 0.07 l 0.17,0.01 0.81,-1.5 0.25,-0.09 2.37,-0.25 3.02,0.07 0.55,0.03 h 0.16 3.35 4.39 0.04 2.23 l 0.24,-0.08 h 0.64 3.81 7.47 l 6.27,2.2 1.67,0.76 15.41,7.24 4.76,1.63"
+           style="fill:none;stroke:#000000;stroke-width:1.28;stroke-linecap:butt;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:0.6"
+           id="path4510" />
+        <path
+           d="M 40.98,21.28 H 210.52 V 280.19 H 40.98 Z"
+           style="fill:none;stroke:#d9d9d9;stroke-width:0.85;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4512" />
+      </g>
+    </g>
+    <g
+       id="g4514" />
+    <g
+       id="g4516">
+      <g
+         id="g4518"
+         clip-path="url(#clipPath4522)" />
+    </g>
+    <g
+       id="g4524" />
+    <g
+       id="g4526" />
+    <g
+       id="g4528" />
+    <g
+       id="g4530" />
+    <g
+       id="g4532" />
+    <g
+       id="g4534" />
+    <g
+       id="g4536" />
+    <g
+       id="g4538" />
+    <g
+       id="g4540" />
+    <g
+       id="g4542" />
+    <g
+       id="g4544" />
+    <g
+       id="g4546" />
+    <g
+       id="g4548" />
+    <g
+       id="g4550" />
+    <g
+       id="g4552">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,29.81)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text4556"><tspan
+           x="0 5.0040002 7.506"
+           y="0"
+           sodipodi:role="line"
+           id="tspan4554">0.0</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,87.17)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text4560"><tspan
+           x="0 5.0040002 7.506"
+           y="0"
+           sodipodi:role="line"
+           id="tspan4558">2.5</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,144.54)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text4564"><tspan
+           x="0 5.0040002 7.506"
+           y="0"
+           sodipodi:role="line"
+           id="tspan4562">5.0</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,23.54,201.91)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text4568"><tspan
+           x="0 5.0040002 7.506"
+           y="0"
+           sodipodi:role="line"
+           id="tspan4566">7.5</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,18.54,259.28)"
+         style="font-variant:normal;font-weight:normal;font-size:9px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#4d4d4d;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text4572"><tspan
+           x="0 5.0040002 10.008 12.51"
+           y="0"
+           sodipodi:role="line"
+           id="tspan4570">10.0</tspan></text>
+    </g>
+    <g
+       id="g4574" />
+    <g
+       id="g4576" />
+    <g
+       id="g4578" />
+    <g
+       id="g4580" />
+    <g
+       id="g4582" />
+    <g
+       id="g4584" />
+    <g
+       id="g4586" />
+    <g
+       id="g4588" />
+    <g
+       id="g4590" />
+    <g
+       id="g4592">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,93.94,7.9)"
+         style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text4596"><tspan
+           x="0 6.7870002 12.903 18.403 20.844999 23.903 26.344999 32.460999 38.577 41.634998 45.298 50.798 59.960999"
+           y="0"
+           sodipodi:role="line"
+           id="tspan4594">Position (cM)</tspan></text>
+    </g>
+    <g
+       id="g4598" />
+    <g
+       id="g4600">
+      <text
+         xml:space="preserve"
+         transform="matrix(0,1,1,0,13.38,124.45)"
+         style="font-variant:normal;font-weight:normal;font-size:11px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text4604"><tspan
+           x="0 6.1160002 14.674 22.615999 25.674 31.174 36.674 42.790001 46.452999"
+           y="0"
+           sodipodi:role="line"
+           id="tspan4602">LOD score</tspan></text>
+    </g>
+    <g
+       id="g4606" />
+    <g
+       id="g4608" />
+    <g
+       id="g4610" />
+    <g
+       id="g4612" />
+    <g
+       id="g4614" />
+    <g
+       id="g4616"
+       transform="translate(29.494517)">
+      <text
+         xml:space="preserve"
+         transform="scale(1,-1)"
+         style="font-style:normal;font-variant:normal;font-weight:normal;font-stretch:normal;font-size:12px;font-family:sans-serif;-inkscape-font-specification:'sans-serif, Normal';font-variant-ligatures:normal;font-variant-caps:normal;font-variant-numeric:normal;font-variant-east-asian:normal;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text4620"
+         x="73.400002"
+         y="-288.29999"><tspan
+           sodipodi:role="line"
+           id="tspan5814"
+           x="73.400002"
+           y="-288.29999">Peak 3</tspan></text>
+    </g>
+    <g
+       id="g4622" />
+    <g
+       id="g4624" />
+    <g
+       id="g4626" />
+    <g
+       id="g4628" />
+    <g
+       id="g4630" />
+    <g
+       id="g4632" />
+    <g
+       id="g4634" />
+    <g
+       id="g4636" />
+    <g
+       id="g4638"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4640"
+         clip-path="url(#clipPath4644)">
+        <path
+           d="m 274.76,152.54 h 96.48 v 37.23 h -96.48 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4646" />
+      </g>
+    </g>
+    <g
+       id="g4648" />
+    <g
+       id="g4650"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4652"
+         clip-path="url(#clipPath4656)">
+        <path
+           d="m 371.24,152.54 h 29.89 v 37.23 h -29.89 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4658" />
+      </g>
+    </g>
+    <g
+       id="g4660" />
+    <g
+       id="g4662"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4664"
+         clip-path="url(#clipPath4668)">
+        <path
+           d="m 401.13,152.54 h 48.03 v 37.23 h -48.03 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4670" />
+      </g>
+    </g>
+    <g
+       id="g4672" />
+    <g
+       id="g4674"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4676"
+         clip-path="url(#clipPath4680)">
+        <path
+           d="m 449.17,152.54 h 41.36 v 37.23 h -41.36 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4682" />
+      </g>
+    </g>
+    <g
+       id="g4684" />
+    <g
+       id="g4686"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4688"
+         clip-path="url(#clipPath4692)">
+        <path
+           d="m 490.53,152.54 h 41.36 v 37.23 h -41.36 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4694" />
+      </g>
+    </g>
+    <g
+       id="g4696" />
+    <g
+       id="g4698"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4700"
+         clip-path="url(#clipPath4704)">
+        <path
+           d="m 531.89,152.54 h 36.67 v 37.23 h -36.67 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4706" />
+      </g>
+    </g>
+    <g
+       id="g4708" />
+    <g
+       id="g4710"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4712"
+         clip-path="url(#clipPath4716)">
+        <path
+           d="m 568.56,152.54 h 36.67 v 37.23 h -36.67 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4718" />
+      </g>
+    </g>
+    <g
+       id="g4720" />
+    <g
+       id="g4722"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4724"
+         clip-path="url(#clipPath4728)">
+        <path
+           d="m 605.23,152.54 h 27.33 v 37.23 h -27.33 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4730" />
+      </g>
+    </g>
+    <g
+       id="g4732" />
+    <g
+       id="g4734"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4736"
+         clip-path="url(#clipPath4740)">
+        <path
+           d="m 632.57,152.54 h 28.67 v 37.23 h -28.67 z"
+           style="fill:#cccccc;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4742" />
+      </g>
+    </g>
+    <g
+       id="g4744" />
+    <g
+       id="g4746"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4748"
+         clip-path="url(#clipPath4752)">
+        <path
+           d="m 274.76,132.58 h 96.48 v 19.95 h -96.48 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4754" />
+      </g>
+    </g>
+    <g
+       id="g4756" />
+    <g
+       id="g4758"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4760"
+         clip-path="url(#clipPath4764)">
+        <path
+           d="m 274.76,112.63 h 96.48 v 19.95 h -96.48 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4766" />
+      </g>
+    </g>
+    <g
+       id="g4768" />
+    <g
+       id="g4770"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4772"
+         clip-path="url(#clipPath4776)">
+        <path
+           d="m 371.24,132.58 h 29.89 v 19.95 h -29.89 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4778" />
+      </g>
+    </g>
+    <g
+       id="g4780" />
+    <g
+       id="g4782"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4784"
+         clip-path="url(#clipPath4788)">
+        <path
+           d="m 371.24,112.63 h 29.89 v 19.95 h -29.89 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4790" />
+      </g>
+    </g>
+    <g
+       id="g4792" />
+    <g
+       id="g4794"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4796"
+         clip-path="url(#clipPath4800)">
+        <path
+           d="m 401.13,132.58 h 48.03 v 19.95 h -48.03 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4802" />
+      </g>
+    </g>
+    <g
+       id="g4804" />
+    <g
+       id="g4806"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4808"
+         clip-path="url(#clipPath4812)">
+        <path
+           d="m 401.13,112.63 h 48.03 v 19.95 h -48.03 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4814" />
+      </g>
+    </g>
+    <g
+       id="g4816" />
+    <g
+       id="g4818"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4820"
+         clip-path="url(#clipPath4824)">
+        <path
+           d="m 449.17,132.58 h 41.36 v 19.95 h -41.36 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4826" />
+      </g>
+    </g>
+    <g
+       id="g4828" />
+    <g
+       id="g4830"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4832"
+         clip-path="url(#clipPath4836)">
+        <path
+           d="m 449.17,112.63 h 41.36 v 19.95 h -41.36 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4838" />
+      </g>
+    </g>
+    <g
+       id="g4840" />
+    <g
+       id="g4842"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4844"
+         clip-path="url(#clipPath4848)">
+        <path
+           d="m 490.53,132.58 h 41.36 v 19.95 h -41.36 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4850" />
+      </g>
+    </g>
+    <g
+       id="g4852" />
+    <g
+       id="g4854"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4856"
+         clip-path="url(#clipPath4860)">
+        <path
+           d="m 490.53,112.63 h 41.36 v 19.95 h -41.36 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4862" />
+      </g>
+    </g>
+    <g
+       id="g4864" />
+    <g
+       id="g4866"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4868"
+         clip-path="url(#clipPath4872)">
+        <path
+           d="m 531.89,132.58 h 36.67 v 19.95 h -36.67 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4874" />
+      </g>
+    </g>
+    <g
+       id="g4876" />
+    <g
+       id="g4878"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4880"
+         clip-path="url(#clipPath4884)">
+        <path
+           d="m 531.89,112.63 h 36.67 v 19.95 h -36.67 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4886" />
+      </g>
+    </g>
+    <g
+       id="g4888" />
+    <g
+       id="g4890"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4892"
+         clip-path="url(#clipPath4896)">
+        <path
+           d="m 568.56,132.58 h 36.67 v 19.95 h -36.67 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4898" />
+      </g>
+    </g>
+    <g
+       id="g4900" />
+    <g
+       id="g4902"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4904"
+         clip-path="url(#clipPath4908)">
+        <path
+           d="m 568.56,112.63 h 36.67 v 19.95 h -36.67 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4910" />
+      </g>
+    </g>
+    <g
+       id="g4912" />
+    <g
+       id="g4914"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4916"
+         clip-path="url(#clipPath4920)">
+        <path
+           d="m 605.23,132.58 h 27.33 v 19.95 h -27.33 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4922" />
+      </g>
+    </g>
+    <g
+       id="g4924" />
+    <g
+       id="g4926"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4928"
+         clip-path="url(#clipPath4932)">
+        <path
+           d="m 605.23,112.63 h 27.33 v 19.95 h -27.33 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4934" />
+      </g>
+    </g>
+    <g
+       id="g4936" />
+    <g
+       id="g4938"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4940"
+         clip-path="url(#clipPath4944)">
+        <path
+           d="m 632.57,132.58 h 28.67 v 19.95 h -28.67 z"
+           style="fill:#f2f2f2;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4946" />
+      </g>
+    </g>
+    <g
+       id="g4948" />
+    <g
+       id="g4950"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4952"
+         clip-path="url(#clipPath4956)">
+        <path
+           d="m 632.57,112.63 h 28.67 v 19.95 h -28.67 z"
+           style="fill:#e5e5e5;fill-opacity:1;fill-rule:nonzero;stroke:#ffffff;stroke-width:1.12;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           id="path4958" />
+      </g>
+    </g>
+    <g
+       id="g4960" />
+    <g
+       id="g4962"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4964"
+         clip-path="url(#clipPath4968)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,302.99,166.85)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4972"><tspan
+             x="0 10.668 17.34 22.007999 28.68 35.352001"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4970">marker</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4974" />
+    <g
+       id="g4976"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4978"
+         clip-path="url(#clipPath4982)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,280.98,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text4986"><tspan
+             x="0 8.0039997 16.667999 24 30.672001 37.344002 44.015999 50.688 57.360001 64.031998 70.704002 77.375999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4984">SNT111392585</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g4988" />
+    <g
+       id="g4990"
+       transform="translate(0,90.420257)">
+      <g
+         id="g4992"
+         clip-path="url(#clipPath4996)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,376.91,166.85)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5000"><tspan
+             x="0 6.552 13.884"
+             y="0"
+             sodipodi:role="line"
+             id="tspan4998">chr</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5002" />
+    <g
+       id="g5004"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5006"
+         clip-path="url(#clipPath5010)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,280.43,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5014"><tspan
+             x="0 9.9960003 15.756 23.76 31.764 38.436001 45.108002 51.779999 58.452 65.124001 71.795998 78.468002"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5012">mJAX00308021</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5016" />
+    <g
+       id="g5018"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5020"
+         clip-path="url(#clipPath5024)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,414.48,166.85)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5028"><tspan
+             x="0 7.3319998 14.664"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5026">pos</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5030" />
+    <g
+       id="g5032"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5034"
+         clip-path="url(#clipPath5038)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,379.52,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5042"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5040">11</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5044" />
+    <g
+       id="g5046"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5048"
+         clip-path="url(#clipPath5052)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,454.84,175.49)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5056"><tspan
+             x="0 6.6719999 10.008 13.344 20.016001 23.351999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5054">allele</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,466.51,158.21)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5060"><tspan
+             x="0"
+             y="0"
+             id="tspan5058">1</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5062" />
+    <g
+       id="g5064"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5066"
+         clip-path="url(#clipPath5070)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,379.52,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5074"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5072">11</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5076" />
+    <g
+       id="g5078"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5080"
+         clip-path="url(#clipPath5084)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,496.2,175.49)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5088"><tspan
+             x="0 6.6719999 10.008 13.344 20.016001 23.351999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5086">allele</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,507.88,158.21)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5092"><tspan
+             x="0"
+             y="0"
+             id="tspan5090">2</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5094" />
+    <g
+       id="g5096"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5098"
+         clip-path="url(#clipPath5102)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,406.8,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5106"><tspan
+             x="0 6.6719999 13.344 16.68 23.351999 30.024"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5104">19.917</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5108" />
+    <g
+       id="g5110"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5112"
+         clip-path="url(#clipPath5116)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,546.56,175.49)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5120"><tspan
+             x="0"
+             y="0"
+             id="tspan5118">n</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,537.56,158.21)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5124"><tspan
+             x="0 8.6639996 18.66"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5122">HM1</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5126" />
+    <g
+       id="g5128"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5130"
+         clip-path="url(#clipPath5134)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,406.8,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5138"><tspan
+             x="0 6.6719999 13.344 16.68 23.351999 30.024"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5136">21.558</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5140" />
+    <g
+       id="g5142"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5144"
+         clip-path="url(#clipPath5148)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,583.23,175.49)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5152"><tspan
+             x="0"
+             y="0"
+             id="tspan5150">n</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,574.23,158.21)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5156"><tspan
+             x="0 8.6639996 18.66"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5154">HM2</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5158" />
+    <g
+       id="g5160"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5162"
+         clip-path="url(#clipPath5166)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,466.18,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5170"><tspan
+             x="0"
+             y="0"
+             id="tspan5168">T</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5172" />
+    <g
+       id="g5174"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5176"
+         clip-path="url(#clipPath5180)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,615.24,175.49)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5184"><tspan
+             x="0"
+             y="0"
+             id="tspan5182">n</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,610.9,158.21)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5188"><tspan
+             x="0 8.6639996"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5186">HT</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5190" />
+    <g
+       id="g5192"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5194"
+         clip-path="url(#clipPath5198)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,466.18,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5202"><tspan
+             x="0"
+             y="0"
+             id="tspan5200">T</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5204" />
+    <g
+       id="g5206"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5208"
+         clip-path="url(#clipPath5212)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,643.24,175.49)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5216"><tspan
+             x="0"
+             y="0"
+             id="tspan5214">n</tspan></text>
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,638.24,158.21)"
+           style="font-variant:normal;font-weight:bold;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5220"><tspan
+             x="0 8.6639996"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5218">NA</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5222" />
+    <g
+       id="g5224"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5226"
+         clip-path="url(#clipPath5230)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,506.88,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5234"><tspan
+             x="0"
+             y="0"
+             id="tspan5232">C</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5236" />
+    <g
+       id="g5238"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5240"
+         clip-path="url(#clipPath5244)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,506.54,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5248"><tspan
+             x="0"
+             y="0"
+             id="tspan5246">G</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5250" />
+    <g
+       id="g5252"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5254"
+         clip-path="url(#clipPath5258)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,548.556,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5262"><tspan
+             x="0"
+             y="0"
+             id="tspan5260">0</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5264" />
+    <g
+       id="g5266"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5268"
+         clip-path="url(#clipPath5272)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,543.56,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5276"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5274">14</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5278" />
+    <g
+       id="g5280"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5282"
+         clip-path="url(#clipPath5286)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,580.23,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5290"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5288">90</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5292" />
+    <g
+       id="g5294"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5296"
+         clip-path="url(#clipPath5300)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,580.23,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5304"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5302">24</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5306" />
+    <g
+       id="g5308"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5310"
+         clip-path="url(#clipPath5314)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,617.236,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5318"><tspan
+             x="0"
+             y="0"
+             id="tspan5316">1</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5320" />
+    <g
+       id="g5322"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5324"
+         clip-path="url(#clipPath5328)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,612.23,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5332"><tspan
+             x="0 6.6719999"
+             y="0"
+             sodipodi:role="line"
+             id="tspan5330">52</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5334" />
+    <g
+       id="g5336"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5338"
+         clip-path="url(#clipPath5342)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,643.57,138.25)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5346"><tspan
+             x="0"
+             y="0"
+             id="tspan5344">3</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5348" />
+    <g
+       id="g5350"
+       transform="translate(0,90.420257)">
+      <g
+         id="g5352"
+         clip-path="url(#clipPath5356)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,643.57,118.3)"
+           style="font-variant:normal;font-weight:normal;font-size:12px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text5360"><tspan
+             x="0"
+             y="0"
+             id="tspan5358">4</tspan></text>
+      </g>
+    </g>
+    <g
+       id="g5362" />
+    <g
+       id="g5364" />
+    <g
+       id="g5366" />
+    <g
+       id="g5368">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,5.78,990.77)"
+         style="font-variant:normal;font-weight:bold;font-size:16px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text5372"><tspan
+           x="0"
+           y="0"
+           id="tspan5370">A</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,365.78,990.77)"
+         style="font-variant:normal;font-weight:bold;font-size:16px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text5376"><tspan
+           x="0"
+           y="0"
+           id="tspan5374">B</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,5.78,637.97)"
+         style="font-variant:normal;font-weight:bold;font-size:16px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text5380"><tspan
+           x="0"
+           y="0"
+           id="tspan5378">C</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,221.78,637.97)"
+         style="font-variant:normal;font-weight:bold;font-size:16px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text5384"><tspan
+           x="0"
+           y="0"
+           id="tspan5382">D</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,5.34,285.17)"
+         style="font-variant:normal;font-weight:bold;font-size:16px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text5388"><tspan
+           x="0"
+           y="0"
+           id="tspan5386">E</tspan></text>
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,220.89,285.17)"
+         style="font-variant:normal;font-weight:bold;font-size:16px;font-family:Helvetica;-inkscape-font-specification:Helvetica-Bold;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text5392"><tspan
+           x="0"
+           y="0"
+           id="tspan5390">F</tspan></text>
+    </g>
+    <g
+       id="g5394" />
+    <g
+       id="g5396" />
+    <g
+       id="g5398" />
+    <g
+       id="g5400" />
+    <g
+       id="g5402" />
+    <g
+       id="g5404" />
+    <g
+       id="g5406" />
+    <g
+       id="g5408" />
+    <g
+       id="g5410" />
+    <g
+       id="g5412" />
+    <g
+       id="g5414" />
+    <g
+       id="g5416" />
+    <g
+       id="g5418" />
+    <g
+       id="g5420" />
+    <g
+       id="g5422" />
+    <g
+       id="g5424" />
+    <g
+       id="g5426" />
+    <g
+       id="g5428" />
+    <g
+       id="g5430" />
+    <g
+       id="g5432" />
+    <g
+       id="g5434" />
+    <g
+       id="g5436" />
+    <g
+       id="g5438" />
+    <g
+       id="g5440" />
+    <g
+       id="g5442" />
+    <g
+       id="g5444" />
+    <g
+       id="g5446" />
+    <g
+       id="g5448" />
+    <g
+       id="g5450" />
+    <g
+       id="g5452" />
+    <g
+       id="g5454" />
+    <g
+       id="g5456" />
+    <g
+       id="g5458" />
+    <g
+       id="g5460" />
+    <g
+       id="g5462" />
+    <g
+       id="g5464" />
+    <g
+       id="g5466" />
+    <g
+       id="g5468" />
+    <g
+       id="g5470" />
+    <g
+       id="g5472" />
+    <g
+       id="g5474" />
+    <g
+       id="g5476" />
+    <g
+       id="g5478" />
+    <g
+       id="g5480" />
+  </g>
+</svg>
diff --git a/article/figures/figS4.pdf b/article/figures/figS4.pdf
index 37e8e9051caacf2d697fd5410fe65c7be75a35e7..bda1d9f88ac13cae068d283ef8c1358d7919dad1 100644
Binary files a/article/figures/figS4.pdf and b/article/figures/figS4.pdf differ
diff --git a/article/figures/figS5.pdf b/article/figures/figS5.pdf
index 014af1be0e3f83c0aad524ac42c1b6d6fbfcff32..bc93413d8cd9f846cb5ce4b163ebfa9398019e65 100644
Binary files a/article/figures/figS5.pdf and b/article/figures/figS5.pdf differ
diff --git a/article/tables/tab_alleles.tex b/article/tables/tab_alleles.tex
index e99c8c42b00655c0864f997e43d506847b506cb7..d2040d813847ad1566b6a3ac496a16202e1ddbd6 100644
--- a/article/tables/tab_alleles.tex
+++ b/article/tables/tab_alleles.tex
@@ -1,5 +1,5 @@
 % latex table generated in R 4.1.0 by xtable 1.8-4 package
-% Mon Jun 27 13:32:58 2022
+% Mon Jun 27 17:36:31 2022
 \begin{table}[ht]
 \centering
 \begin{tabular}{llrr}