diff --git a/article/.RData b/article/.RData
index f78fa91db23ce72d914d2fd2959a84b37d1b5221..8aec2b9af85a598243dbff9e2223d57e9e682917 100644
Binary files a/article/.RData and b/article/.RData differ
diff --git a/article/article_figures.Rmd b/article/article_figures.Rmd
index b41f5f79542afdbe174ad204bca9b910b30d175b..b7301e780ed068935a17a9c7541cc9d8822374bb 100644
--- a/article/article_figures.Rmd
+++ b/article/article_figures.Rmd
@@ -52,7 +52,7 @@ na_plot <- tab2 %>% mutate(prop_NA=n_NA/176) %>% ggplot(aes(x=prop_NA)) +
   scale_y_log10(expand = c(.01, .01)) +
   scale_x_continuous(expand = c(.005, .005)) +
   theme_classic() +
-  labs(title="Proportion of missing genotyped",
+  labs(title="Proportion of missing genotypes",
        x="Proportion of NA",y="Number of markers") +
   theme(
     aspect.ratio=0.8,
@@ -79,7 +79,7 @@ prop_plot <- tab2 %>% filter(n_NA<88) %>% filter(!chr %in% c("M","X","Y")) %>%
   geom_abline(intercept = 0.9, slope=-1,linetype="dashed",size=.3) +
   scale_x_continuous(expand = c(.005, .005)) +
   scale_y_continuous(expand = c(.005, .005)) +
-  labs(title="Exclusion of markers with mark_prop()",
+  labs(title="Exclusion of markers by mark_prop()",
        x="Proportion of A/A individuals",
        y="Proportion of B/B individuals",
        color="Exclusion") +
diff --git a/article/data1/.RData b/article/data1/.RData
index 4f06f6f51d2274275982330ee25e14017b38a387..bb9bc0306d09121f707e8bd9bec2f26ffce7144a 100644
Binary files a/article/data1/.RData and b/article/data1/.RData differ
diff --git a/article/data1/data1.Rmd b/article/data1/data1.Rmd
index 43ef14cd8c6eb0ab1c3bb23befc765f3c174b000..7afdee79cc47837e21a0754cded6290d3ae95b26 100644
--- a/article/data1/data1.Rmd
+++ b/article/data1/data1.Rmd
@@ -224,10 +224,10 @@ rec_ratios %>% summarise(mean=mean(rat_prev,na.rm=TRUE),
 rec_ratios_before <- rec_ratios %>% ggplot(aes(x=rat_prev)) +
   geom_histogram(binwidth = .1,alpha=0.4, position="identity",fill="#990000") +
   scale_x_log10(limits=c(0.2,1000)) +
-  labs(x="Ratio between the calculated and the known distance with the previous marker",
-       y="Count",
+  labs(x="Ratio between the calculated and the known distances",
+       y="Marker pairs",
        fill="",
-       title="Distance between adjacent markers") +
+       title="Distances between adjacent markers") +
   geom_vline(xintercept = 5,linetype="dashed") +
   ggpubr::theme_classic2() +
   theme(plot.title = element_text(face="plain",size=14,hjust=0.5)) 
@@ -327,6 +327,49 @@ plotMap(cross_after2,newmap_after2,shift=TRUE)
 plotmap_after <- ~plotMap(cross_after2,newmap_after2,shift=TRUE,main="")
 ```
 
+### map length
+
+```{r}
+#calc map
+length_calc <- newmap_after2[["1"]][[length(newmap_after2[["1"]])]] + newmap_after2[["2"]][[length(newmap_after2[["2"]])]] +
+  newmap_after2[["3"]][[length(newmap_after2[["3"]])]] + newmap_after2[["4"]][[length(newmap_after2[["4"]])]] +
+  newmap_after2[["5"]][[length(newmap_after2[["5"]])]] + newmap_after2[["6"]][[length(newmap_after2[["6"]])]] +
+  newmap_after2[["7"]][[length(newmap_after2[["7"]])]] + newmap_after2[["8"]][[length(newmap_after2[["8"]])]] +
+  newmap_after2[["9"]][[length(newmap_after2[["9"]])]] + newmap_after2[["10"]][[length(newmap_after2[["10"]])]] +
+  newmap_after2[["11"]][[length(newmap_after2[["11"]])]] + newmap_after2[["12"]][[length(newmap_after2[["12"]])]] +
+  newmap_after2[["13"]][[length(newmap_after2[["13"]])]] + newmap_after2[["14"]][[length(newmap_after2[["14"]])]] +
+  newmap_after2[["15"]][[length(newmap_after2[["15"]])]] + newmap_after2[["16"]][[length(newmap_after2[["16"]])]] +
+  newmap_after2[["17"]][[length(newmap_after2[["17"]])]] + newmap_after2[["18"]][[length(newmap_after2[["18"]])]] +
+  newmap_after2[["19"]][[length(newmap_after2[["19"]])]] + newmap_after2[["X"]][[length(newmap_after2[["X"]])]]
+
+#known map
+lengh_known <- cross_after2[["geno"]][["1"]][["map"]][[length(cross_after2[["geno"]][["1"]][["map"]])]] +
+  cross_after2[["geno"]][["2"]][["map"]][[length(cross_after2[["geno"]][["2"]][["map"]])]] +
+  cross_after2[["geno"]][["3"]][["map"]][[length(cross_after2[["geno"]][["3"]][["map"]])]] + 
+  cross_after2[["geno"]][["4"]][["map"]][[length(cross_after2[["geno"]][["4"]][["map"]])]] +
+  cross_after2[["geno"]][["5"]][["map"]][[length(cross_after2[["geno"]][["5"]][["map"]])]] + 
+  cross_after2[["geno"]][["6"]][["map"]][[length(cross_after2[["geno"]][["6"]][["map"]])]] +
+  cross_after2[["geno"]][["7"]][["map"]][[length(cross_after2[["geno"]][["7"]][["map"]])]] + 
+  cross_after2[["geno"]][["8"]][["map"]][[length(cross_after2[["geno"]][["8"]][["map"]])]] +
+  cross_after2[["geno"]][["9"]][["map"]][[length(cross_after2[["geno"]][["9"]][["map"]])]] + 
+  cross_after2[["geno"]][["10"]][["map"]][[length(cross_after2[["geno"]][["10"]][["map"]])]] +
+  cross_after2[["geno"]][["11"]][["map"]][[length(cross_after2[["geno"]][["11"]][["map"]])]] + 
+  cross_after2[["geno"]][["12"]][["map"]][[length(cross_after2[["geno"]][["12"]][["map"]])]] +
+  cross_after2[["geno"]][["13"]][["map"]][[length(cross_after2[["geno"]][["13"]][["map"]])]] + 
+  cross_after2[["geno"]][["14"]][["map"]][[length(cross_after2[["geno"]][["14"]][["map"]])]] +
+  cross_after2[["geno"]][["15"]][["map"]][[length(cross_after2[["geno"]][["15"]][["map"]])]] + 
+  cross_after2[["geno"]][["16"]][["map"]][[length(cross_after2[["geno"]][["16"]][["map"]])]] +
+  cross_after2[["geno"]][["17"]][["map"]][[length(cross_after2[["geno"]][["17"]][["map"]])]] + 
+  cross_after2[["geno"]][["18"]][["map"]][[length(cross_after2[["geno"]][["18"]][["map"]])]] +
+  cross_after2[["geno"]][["19"]][["map"]][[length(cross_after2[["geno"]][["19"]][["map"]])]] + 
+  cross_after2[["geno"]][["X"]][["map"]][[length(cross_after2[["geno"]][["X"]][["map"]])]]
+
+#ratio 
+length_rat <- length_calc/lengh_known
+length_rat
+```
+
+
 ### After: plot genome scan
 
 ```{r after_scan}
@@ -369,7 +412,7 @@ pheno_after_zoom <- qtl_plot(pheno_after,lod=data.frame(group = c("alpha=0.05",
           strip.background = element_blank(),
           strip.text.x = element_blank()) +
     xlab("Position (cM)") +
-    ggtitle("QTL") +
+    ggtitle("Chromosome 12 QTL") +
     theme(plot.title = element_text(face="plain",size=14)) 
 pheno_after_zoom
 ```
@@ -433,10 +476,10 @@ rec_ratios %>% summarise(mean=mean(rat_prev,na.rm=TRUE),
 rec_ratios_after <- rec_ratios %>% ggplot(aes(x=rat_prev)) +
   geom_histogram(binwidth = .1,alpha=0.4, position="identity",fill="#2171b5") +
   scale_x_log10(limits=c(0.2,1000)) +
-  labs(x="Ratio between the calculated and the known distance with the previous marker",
-       y="Count",
+  labs(x="Ratio between the calculated and the known distances",
+       y="Marker pairs",
        fill="",
-       title="Distance between adjacent markers") +
+       title="Distances between adjacent markers") +
   ggpubr::theme_classic2() +
   theme(plot.title = element_text(face="plain",size=14,hjust=0.5)) 
 
@@ -614,7 +657,7 @@ test_plot
 pheno_data1 <- phenos %>% ggplot(aes(x=Pheno)) +
   geom_histogram(binwidth=0.1) +
   ggpubr::theme_classic2() +
-  labs(y="Count", x="Quantitative phenotype",title="Dataset 1") +
+  labs(y="F2 individuals", x="Quantitative phenotype",title="Dataset 1") +
   theme(plot.title = element_text(hjust=0.5,size=14)) 
 pheno_data1
 ```
diff --git a/article/data1/data1.rda b/article/data1/data1.rda
index 20c8cb06f2cc990e86813d1a1cd9e86bde1b4442..5d2b6d60fdc7505a1485f1549768b7c672009381 100644
Binary files a/article/data1/data1.rda and b/article/data1/data1.rda differ
diff --git a/article/data2/.RData b/article/data2/.RData
index c7a147a98a089aa8d06666d9cec844875a62a60a..d92a9cdae8d2f3e508257d8bea937700d963f078 100644
Binary files a/article/data2/.RData and b/article/data2/.RData differ
diff --git a/article/data2/data2.Rmd b/article/data2/data2.Rmd
index 742a10a706bd271938bbfeb753cfff0b972faaf0..6d5ca423f6ab44b4314c9629445f9b8a62494bf8 100644
--- a/article/data2/data2.Rmd
+++ b/article/data2/data2.Rmd
@@ -149,10 +149,10 @@ rec_ratios %>% summarise(mean=mean(rat_prev,na.rm=TRUE),
 rec_ratios_before_data2 <- rec_ratios %>% ggplot(aes(x=rat_prev)) +
   geom_histogram(binwidth = .1,alpha=0.4, position="identity",fill="#990000") +
   scale_x_log10(limits=c(0.2,1000)) +
-  labs(x="Ratio between the calculated and the known distance with the previous marker",
-       y="Count",
+  labs(x="Ratio between the calculated and the known distances",
+       y="Marker pairs",
        fill="",
-       title="Distance between adjacent markers") +
+       title="Distances between adjacent markers") +
   geom_vline(xintercept = 5,linetype="dashed") +
   ggpubr::theme_classic2() +
   theme(plot.title = element_text(face="plain",size=14,hjust=0.5)) 
@@ -164,6 +164,13 @@ rec_ratios %>% mutate(group_rat=case_when(rat_prev<5 ~ 0,
                                           rat_prev >=5 ~ 1)) %>%
   group_by(group_rat) %>% summarise(n=n(),p=n()/nrow(rec_ratios))
 
+#meansd of peak <5
+rec_ratios %>% filter(rat_prev<5) %>% summarise(mean=mean(rat_prev),
+                                                sd=sd(rat_prev))
+
+#max ratio
+rec_ratios %>% summarise(max=max(rat_prev))
+
 rm(mark,chr,pos,place,previous,follow,kn_previous,kn_follow,fol,kn_fol,kn_pos,kn_prev,i,prev)
 ```
 
@@ -221,6 +228,47 @@ plotmap_after_data2 <- ~plotMap(cross_after_data2,newmap_after_data2,shift=TRUE,
 tab2 <- mark_estmap(tab=tab2,map=newmap_after,annot=annot_mini) #0 marker removed
 ```
 
+### map length
+
+```{r}
+#calc map
+length_calc <- newmap_after[["1"]][[length(newmap_after[["1"]])]] + newmap_after[["2"]][[length(newmap_after[["2"]])]] +
+  newmap_after[["3"]][[length(newmap_after[["3"]])]] + newmap_after[["4"]][[length(newmap_after[["4"]])]] +
+  newmap_after[["5"]][[length(newmap_after[["5"]])]] + newmap_after[["6"]][[length(newmap_after[["6"]])]] +
+  newmap_after[["7"]][[length(newmap_after[["7"]])]] + newmap_after[["8"]][[length(newmap_after[["8"]])]] +
+  newmap_after[["9"]][[length(newmap_after[["9"]])]] + newmap_after[["10"]][[length(newmap_after[["10"]])]] +
+  newmap_after[["11"]][[length(newmap_after[["11"]])]] + newmap_after[["12"]][[length(newmap_after[["12"]])]] +
+  newmap_after[["13"]][[length(newmap_after[["13"]])]] + newmap_after[["14"]][[length(newmap_after[["14"]])]] +
+  newmap_after[["15"]][[length(newmap_after[["15"]])]] + newmap_after[["16"]][[length(newmap_after[["16"]])]] +
+  newmap_after[["17"]][[length(newmap_after[["17"]])]] + newmap_after[["18"]][[length(newmap_after[["18"]])]] +
+  newmap_after[["19"]][[length(newmap_after[["19"]])]] + newmap_after[["X"]][[length(newmap_after[["X"]])]]
+
+#known map
+lengh_known <- cross_after[["geno"]][["1"]][["map"]][[length(cross_after[["geno"]][["1"]][["map"]])]] +
+  cross_after[["geno"]][["2"]][["map"]][[length(cross_after[["geno"]][["2"]][["map"]])]] +
+  cross_after[["geno"]][["3"]][["map"]][[length(cross_after[["geno"]][["3"]][["map"]])]] + 
+  cross_after[["geno"]][["4"]][["map"]][[length(cross_after[["geno"]][["4"]][["map"]])]] +
+  cross_after[["geno"]][["5"]][["map"]][[length(cross_after[["geno"]][["5"]][["map"]])]] + 
+  cross_after[["geno"]][["6"]][["map"]][[length(cross_after[["geno"]][["6"]][["map"]])]] +
+  cross_after[["geno"]][["7"]][["map"]][[length(cross_after[["geno"]][["7"]][["map"]])]] + 
+  cross_after[["geno"]][["8"]][["map"]][[length(cross_after[["geno"]][["8"]][["map"]])]] +
+  cross_after[["geno"]][["9"]][["map"]][[length(cross_after[["geno"]][["9"]][["map"]])]] + 
+  cross_after[["geno"]][["10"]][["map"]][[length(cross_after[["geno"]][["10"]][["map"]])]] +
+  cross_after[["geno"]][["11"]][["map"]][[length(cross_after[["geno"]][["11"]][["map"]])]] + 
+  cross_after[["geno"]][["12"]][["map"]][[length(cross_after[["geno"]][["12"]][["map"]])]] +
+  cross_after[["geno"]][["13"]][["map"]][[length(cross_after[["geno"]][["13"]][["map"]])]] + 
+  cross_after[["geno"]][["14"]][["map"]][[length(cross_after[["geno"]][["14"]][["map"]])]] +
+  cross_after[["geno"]][["15"]][["map"]][[length(cross_after[["geno"]][["15"]][["map"]])]] + 
+  cross_after[["geno"]][["16"]][["map"]][[length(cross_after[["geno"]][["16"]][["map"]])]] +
+  cross_after[["geno"]][["17"]][["map"]][[length(cross_after[["geno"]][["17"]][["map"]])]] + 
+  cross_after[["geno"]][["18"]][["map"]][[length(cross_after[["geno"]][["18"]][["map"]])]] +
+  cross_after[["geno"]][["19"]][["map"]][[length(cross_after[["geno"]][["19"]][["map"]])]] + 
+  cross_after[["geno"]][["X"]][["map"]][[length(cross_after[["geno"]][["X"]][["map"]])]]
+
+#ratio 
+length_rat <- length_calc/lengh_known
+length_rat
+```
 
 ```{r after_scan}
 # load rda with perm
@@ -243,7 +291,8 @@ pheno_after_plot_data2 <- qtl_plot(pheno_after,lod=data.frame(group = c("alpha=0
          ylab="LOD score",
          title="QTL mapping",
          x.label = element_blank(),
-         size=0.6) +
+         size=0.6,
+         strip.pos="bottom") +
     theme(legend.position = "none") +
     ggtitle("Dataset 2: genome scan") +
   theme(plot.title = element_text(face="plain",size=14,hjust=0.5)) 
@@ -338,10 +387,10 @@ rec_ratios %>% summarise(mean=mean(rat_prev,na.rm=TRUE),
 rec_ratios_after_data2 <- rec_ratios %>% ggplot(aes(x=rat_prev)) +
   geom_histogram(binwidth = .1,alpha=0.4, position="identity",fill="#2171b5") +
   scale_x_log10(limits=c(0.2,1000)) +
-  labs(x="Ratio between the calculated and the known distance with the previous marker",
-       y="Count",
+  labs(x="Ratio between the calculated and the known distances",
+       y="Marker pairs",
        fill="",
-       title="Distance between adjacent markers") +
+       title="Distances between adjacent markers") +
   ggpubr::theme_classic2() +
   theme(plot.title = element_text(face="plain",size=14,hjust=0.5)) 
 
@@ -383,7 +432,7 @@ rm(chrs)
 
 
 ### Peak 3
-
+grid_scans
 ```{r peak3_zoom}
 peak3 <- qtl_plot(pheno_before,lod=data.frame(group = c("alpha=0.05", "alpha=0.1","alpha=0.63"),
                  lod = threshold_before[1:3]),
@@ -454,7 +503,7 @@ The two markers before the pseudomarker have an excess of homozygous.
 pheno_data2 <- phenos %>% ggplot(aes(x=Pheno)) +
   geom_histogram(binwidth=0.1) +
   ggpubr::theme_classic2() +
-  labs(y="Count", x="Quantitative phenotype",title="Dataset 2") +
+  labs(y="F2 individuals", x="Quantitative phenotype",title="Dataset 2") +
   theme(plot.title = element_text(hjust=0.5,size=14)) 
 pheno_data2
 ```
diff --git a/article/data2/data2.rda b/article/data2/data2.rda
index 525cbaca5ff2573ce023bf31e95c147bcefc44af..74dc2b1d989e7f5142abd682169e001fafb4c653 100644
Binary files a/article/data2/data2.rda and b/article/data2/data2.rda differ
diff --git a/article/data3/.RData b/article/data3/.RData
index 4556a6846ea608f2edeae3410de6dd40e51dba54..76269d6d675d7fb5e2763b5090ee83a94661bcad 100644
Binary files a/article/data3/.RData and b/article/data3/.RData differ
diff --git a/article/data3/data3.Rmd b/article/data3/data3.Rmd
index 420154a58d6b106568e4d4310d4b2d41fb969008..66fc2e822909fe5bbd9901354a1338fd7306baff 100644
--- a/article/data3/data3.Rmd
+++ b/article/data3/data3.Rmd
@@ -148,10 +148,10 @@ rec_ratios %>% summarise(mean=mean(rat_prev,na.rm=TRUE),
 rec_ratios_before_data3 <- rec_ratios %>% ggplot(aes(x=rat_prev)) +
   geom_histogram(binwidth = .1,alpha=0.4, position="identity",fill="#990000") +
   scale_x_log10(limits=c(0.2,1000)) +
-  labs(x="Ratio between the calculated and the known distance with the previous marker",
-       y="Count",
+  labs(x="Ratio between the calculated and the known distances",
+       y="Marker pairs",
        fill="",
-       title="Distance between adjacent markers") +
+       title="Distances between adjacent markers") +
   geom_vline(xintercept = 5,linetype="dashed") +
   ggpubr::theme_classic2() +
   theme(plot.title = element_text(hjust=0.5,size=14)) 
@@ -266,6 +266,48 @@ newmap_after_data3 <- newmap_after2
 plotmap_after_data3 <- ~plotMap(cross_after_data3,newmap_after_data3,shift=TRUE,main="")
 ```
 
+### map length
+
+```{r}
+#calc map
+length_calc <- newmap_after2[["1"]][[length(newmap_after2[["1"]])]] + newmap_after2[["2"]][[length(newmap_after2[["2"]])]] +
+  newmap_after2[["3"]][[length(newmap_after2[["3"]])]] + newmap_after2[["4"]][[length(newmap_after2[["4"]])]] +
+  newmap_after2[["5"]][[length(newmap_after2[["5"]])]] + newmap_after2[["6"]][[length(newmap_after2[["6"]])]] +
+  newmap_after2[["7"]][[length(newmap_after2[["7"]])]] + newmap_after2[["8"]][[length(newmap_after2[["8"]])]] +
+  newmap_after2[["9"]][[length(newmap_after2[["9"]])]] + newmap_after2[["10"]][[length(newmap_after2[["10"]])]] +
+  newmap_after2[["11"]][[length(newmap_after2[["11"]])]] + newmap_after2[["12"]][[length(newmap_after2[["12"]])]] +
+  newmap_after2[["13"]][[length(newmap_after2[["13"]])]] + newmap_after2[["14"]][[length(newmap_after2[["14"]])]] +
+  newmap_after2[["15"]][[length(newmap_after2[["15"]])]] + newmap_after2[["16"]][[length(newmap_after2[["16"]])]] +
+  newmap_after2[["17"]][[length(newmap_after2[["17"]])]] + newmap_after2[["18"]][[length(newmap_after2[["18"]])]] +
+  newmap_after2[["19"]][[length(newmap_after2[["19"]])]] + newmap_after2[["X"]][[length(newmap_after2[["X"]])]]
+
+#known map
+lengh_known <- cross_after2[["geno"]][["1"]][["map"]][[length(cross_after2[["geno"]][["1"]][["map"]])]] +
+  cross_after2[["geno"]][["2"]][["map"]][[length(cross_after2[["geno"]][["2"]][["map"]])]] +
+  cross_after2[["geno"]][["3"]][["map"]][[length(cross_after2[["geno"]][["3"]][["map"]])]] + 
+  cross_after2[["geno"]][["4"]][["map"]][[length(cross_after2[["geno"]][["4"]][["map"]])]] +
+  cross_after2[["geno"]][["5"]][["map"]][[length(cross_after2[["geno"]][["5"]][["map"]])]] + 
+  cross_after2[["geno"]][["6"]][["map"]][[length(cross_after2[["geno"]][["6"]][["map"]])]] +
+  cross_after2[["geno"]][["7"]][["map"]][[length(cross_after2[["geno"]][["7"]][["map"]])]] + 
+  cross_after2[["geno"]][["8"]][["map"]][[length(cross_after2[["geno"]][["8"]][["map"]])]] +
+  cross_after2[["geno"]][["9"]][["map"]][[length(cross_after2[["geno"]][["9"]][["map"]])]] + 
+  cross_after2[["geno"]][["10"]][["map"]][[length(cross_after2[["geno"]][["10"]][["map"]])]] +
+  cross_after2[["geno"]][["11"]][["map"]][[length(cross_after2[["geno"]][["11"]][["map"]])]] + 
+  cross_after2[["geno"]][["12"]][["map"]][[length(cross_after2[["geno"]][["12"]][["map"]])]] +
+  cross_after2[["geno"]][["13"]][["map"]][[length(cross_after2[["geno"]][["13"]][["map"]])]] + 
+  cross_after2[["geno"]][["14"]][["map"]][[length(cross_after2[["geno"]][["14"]][["map"]])]] +
+  cross_after2[["geno"]][["15"]][["map"]][[length(cross_after2[["geno"]][["15"]][["map"]])]] + 
+  cross_after2[["geno"]][["16"]][["map"]][[length(cross_after2[["geno"]][["16"]][["map"]])]] +
+  cross_after2[["geno"]][["17"]][["map"]][[length(cross_after2[["geno"]][["17"]][["map"]])]] + 
+  cross_after2[["geno"]][["18"]][["map"]][[length(cross_after2[["geno"]][["18"]][["map"]])]] +
+  cross_after2[["geno"]][["19"]][["map"]][[length(cross_after2[["geno"]][["19"]][["map"]])]] + 
+  cross_after2[["geno"]][["X"]][["map"]][[length(cross_after2[["geno"]][["X"]][["map"]])]]
+
+#ratio 
+length_rat <- length_calc/lengh_known
+length_rat
+```
+
 ```{r after_scan}
 # load rda with perm
 after_1000p2 <- scanone(cross=cross_after2, 
@@ -289,7 +331,8 @@ pheno_after_plot_data3 <- qtl_plot(pheno_after,lod=data.frame(group = c("alpha=0
          ylab="LOD score",
          title="QTL mapping",
          x.label = element_blank(),
-         size=0.6) +
+         size=0.6,
+         strip.pos="bottom") +
     theme(legend.position = "none") +
     ggtitle("Dataset 3: genome scan") +
    theme(plot.title = element_text(face="plain",size=14,hjust=0.5)) 
@@ -355,10 +398,10 @@ rec_ratios %>% summarise(mean=mean(rat_prev,na.rm=TRUE),
 rec_ratios_after_data3 <- rec_ratios %>% ggplot(aes(x=rat_prev)) +
   geom_histogram(binwidth = .1,alpha=0.4, position="identity",fill="#2171b5") +
   scale_x_log10(limits=c(0.2,1000)) +
-  labs(x="Ratio between the calculated and the known distance with the previous marker",
-       y="Count",
+  labs(x="Ratio between the calculated and the known distances",
+       y="Marker pairs",
        fill="",
-       title="Distance between adjacent markers") +
+       title="Distances between adjacent markers") +
   ggpubr::theme_classic2() +
   theme(plot.title = element_text(hjust=0.5,size=14)) 
 
@@ -488,7 +531,7 @@ geno_plot4
 pheno_data3 <- phenos %>% ggplot(aes(x=Pheno)) +
   geom_histogram(binwidth=0.2) +
   ggpubr::theme_classic2() +
-  labs(y="Count", x="Quantitative phenotype",title="Dataset 3") +
+  labs(y="F2 individuals", x="Quantitative phenotype",title="Dataset 3") +
   theme(plot.title = element_text(hjust=0.5,size=14)) 
 pheno_data3
 ```
diff --git a/article/data3/data3.rda b/article/data3/data3.rda
index c3c8007a2c91ace87ed8fc2346ab54d312ba9e96..97bb433a864a924bad45497d111bfaf14784e21e 100644
Binary files a/article/data3/data3.rda and b/article/data3/data3.rda differ
diff --git a/article/figures/fig1.pdf b/article/figures/fig1.pdf
index fcd73653928854b5c6da7512bc4a34862f85061a..5a884988a7ca6f0abe701102e336f960377ad6d5 100644
Binary files a/article/figures/fig1.pdf and b/article/figures/fig1.pdf differ
diff --git a/article/figures/fig1prev.pdf b/article/figures/fig1prev.pdf
index 8e8f27af51586f8395a2f2c542f94b65c3884755..636b4bae390014248f0339fd8dcdaf0faec14fab 100644
Binary files a/article/figures/fig1prev.pdf and b/article/figures/fig1prev.pdf differ
diff --git a/article/figures/fig1prev.svg b/article/figures/fig1prev.svg
index a6de6e6e4dfb6470e1557d11d67214d698562694..79aabb4ad43ac6abf82a6e17a9cc7ca1b8cd5803 100644
--- a/article/figures/fig1prev.svg
+++ b/article/figures/fig1prev.svg
@@ -24505,9 +24505,9 @@
      inkscape:pagecheckerboard="0"
      inkscape:deskcolor="#d1d1d1"
      showgrid="true"
-     inkscape:zoom="0.62608414"
-     inkscape:cx="566.21782"
-     inkscape:cy="556.63445"
+     inkscape:zoom="0.62608415"
+     inkscape:cx="388.92535"
+     inkscape:cy="414.48102"
      inkscape:window-width="1848"
      inkscape:window-height="1016"
      inkscape:window-x="72"
@@ -24520,7 +24520,7 @@
        id="page24"
        width="1344"
        height="960"
-       inkscape:export-filename="fig1.png"
+       inkscape:export-filename="fig1.pdf"
        inkscape:export-xdpi="96"
        inkscape:export-ydpi="96" />
     <inkscape:grid
@@ -69524,32 +69524,10 @@
        id="g41386" />
     <g
        id="g41388" />
-    <g
-       id="g41390">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,562.97,368.62)"
-         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="text41394"><tspan
-           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799 286.52399 295.18799 297.85199 301.18799 307.85999 311.19601 314.53201 321.20401 327.87601 331.21201 337.884 341.88 348.19199 354.19199 356.85599 363.52802 370.20001 376.20001 379.53601 389.53201 396.20401 400.38 406.14001 412.81201"
-           y="0"
-           sodipodi:role="line"
-           id="tspan41392">Ratio between the calculated and the known distance with the previous marker</tspan></text>
-    </g>
     <g
        id="g41396" />
     <g
-       id="g41398">
-      <text
-         xml:space="preserve"
-         transform="matrix(0,1,1,0,518.59,528.94)"
-         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="text41402"><tspan
-           x="0 8.6639996 15.336 22.007999 28.68"
-           y="0"
-           sodipodi:role="line"
-           id="tspan41400">Count</tspan></text>
-    </g>
+       id="g41398" />
     <g
        id="g41404" />
     <g
@@ -69562,15 +69540,19 @@
        id="g41412" />
     <g
        id="g41414">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,660.21,703.97)"
-         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
-         id="text41418"><tspan
-           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 58.352001 66.136002 73.919998 77.811996 87.779999 95.564003 103.348 111.132 115.024 122.808 130.592 133.7 141.48399 148.48399 156.26801 164.052 167.944 171.836 183.498 191.282 196.15401 202.87399 210.658 215.32001"
-           y="0"
-           sodipodi:role="line"
-           id="tspan41416">Distance between adjacent markers</tspan></text>
+      <g
+         id="g63361"
+         transform="translate(2.6644891e-4,2.6785441e-4)">
+        <text
+           xml:space="preserve"
+           transform="matrix(1,0,0,-1,656.71,703.97)"
+           style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+           id="text63365"><tspan
+             x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 61.459999 65.351997 73.136002 80.919998 84.811996 94.779999 102.564 110.348 118.132 122.024 129.808 137.592 140.7 148.48399 155.48399 163.26801 171.052 174.944 178.836 190.498 198.282 203.15401 209.87399 217.658 222.32001"
+             y="0"
+             sodipodi:role="line"
+             id="tspan63363">Distances between adjacent markers</tspan></text>
+      </g>
     </g>
     <g
        id="g41414-3"
@@ -69585,7 +69567,7 @@
            sodipodi:role="line"
            id="tspan45601"
            x="652.95398"
-           y="-711.46997">Reference and calculated marker map</tspan><tspan
+           y="-711.46997">Reference and calculated marker maps</tspan><tspan
            sodipodi:role="line"
            id="tspan45603"
            x="652.95398"
@@ -71908,8 +71890,8 @@
            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="path43400" />
         <path
-           d="m 756.72,31.91 v 9.12"
-           style="fill:#ff0000;stroke:#ff0000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           d="M 757.71826,-863.11665 V 49.743905"
+           style="fill:#ff0000;stroke:#ff0000;stroke-width:2.10092;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
            id="path43402" />
         <path
            d="m 764.71,31.91 v 9.12"
@@ -72852,5 +72834,29 @@
            id="path85332" />
       </g>
     </g>
+    <text
+       xml:space="preserve"
+       transform="matrix(0,1,1,0,0,0)"
+       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="text91893"
+       x="511.64026"
+       y="518.59039"><tspan
+         x="511.64026 521.63623 528.30823 532.48425 538.24426 544.91626 548.91223 552.24823 558.92023 565.59229 568.25629 572.25226"
+         y="518.59039"
+         sodipodi:role="line"
+         id="tspan91891">Marker pairs</tspan></text>
+    <g
+       id="g63337"
+       transform="translate(2.6569741e-4,-2.4056581e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,626.78,368.62)"
+         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="text63341"><tspan
+           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799"
+           y="0"
+           sodipodi:role="line"
+           id="tspan63339">Ratio between the calculated and the known distances</tspan></text>
+    </g>
   </g>
 </svg>
diff --git a/article/figures/fig2.pdf b/article/figures/fig2.pdf
index 687730c19be78f5b558cfefc87b9e584c0b1ecf5..ca3fcce75fa4236c60a6fd25d5ebcce5ee727e2d 100644
Binary files a/article/figures/fig2.pdf and b/article/figures/fig2.pdf differ
diff --git a/article/figures/fig2.png b/article/figures/fig2.png
index c29b317d9b39c6b7511c59d9db868d0c141ceff8..56a3209dee0be894943ff9f2179fad2c48a562ae 100644
Binary files a/article/figures/fig2.png and b/article/figures/fig2.png differ
diff --git a/article/figures/fig3.pdf b/article/figures/fig3.pdf
index 18039841880869ae39c09a55c2a29489352c9946..df510b2163f3200ad3fe0fcdeedb980a6aaf2a23 100644
Binary files a/article/figures/fig3.pdf and b/article/figures/fig3.pdf differ
diff --git a/article/figures/fig3prev.pdf b/article/figures/fig3prev.pdf
index a7054ef932e3d5acbc411e0a6bab54c41aebefe8..0d0893109f60961987ef8ccf159e1352329dd558 100644
Binary files a/article/figures/fig3prev.pdf and b/article/figures/fig3prev.pdf differ
diff --git a/article/figures/fig3prev.svg b/article/figures/fig3prev.svg
index 6633cdf8ffc639007e0ce0c809f1dd3caf6edee3..0279e275b5334f40a8be0b51ce43b27b0b99d4ac 100644
--- a/article/figures/fig3prev.svg
+++ b/article/figures/fig3prev.svg
@@ -16755,25 +16755,28 @@
      inkscape:pageopacity="0.0"
      inkscape:pagecheckerboard="0"
      inkscape:deskcolor="#d1d1d1"
-     showgrid="false"
-     inkscape:zoom="0.62608413"
-     inkscape:cx="261.14701"
-     inkscape:cy="572.60675"
+     showgrid="true"
+     inkscape:zoom="0.6476551"
+     inkscape:cx="513.39054"
+     inkscape:cy="643.0892"
      inkscape:window-width="1848"
      inkscape:window-height="1016"
      inkscape:window-x="72"
      inkscape:window-y="27"
      inkscape:window-maximized="1"
-     inkscape:current-layer="g51982">
+     inkscape:current-layer="g21978">
     <inkscape:page
        x="0"
        y="0"
        id="page21976"
        width="1344"
        height="960"
-       inkscape:export-filename="fig3.png"
+       inkscape:export-filename="fig3.pdf"
        inkscape:export-xdpi="96"
        inkscape:export-ydpi="96" />
+    <inkscape:grid
+       type="xygrid"
+       id="grid15414" />
   </sodipodi:namedview>
   <g
      id="g21978"
@@ -47637,32 +47640,10 @@
        id="g50112" />
     <g
        id="g50114" />
-    <g
-       id="g50116">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,562.97,368.62)"
-         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="text50120"><tspan
-           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799 286.52399 295.18799 297.85199 301.18799 307.85999 311.19601 314.53201 321.20401 327.87601 331.21201 337.884 341.88 348.19199 354.19199 356.85599 363.52802 370.20001 376.20001 379.53601 389.53201 396.20401 400.38 406.14001 412.81201"
-           y="0"
-           sodipodi:role="line"
-           id="tspan50118">Ratio between the calculated and the known distance with the previous marker</tspan></text>
-    </g>
     <g
        id="g50122" />
     <g
-       id="g50124">
-      <text
-         xml:space="preserve"
-         transform="matrix(0,1,1,0,518.59,528.94)"
-         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="text50128"><tspan
-           x="0 8.6639996 15.336 22.007999 28.68"
-           y="0"
-           sodipodi:role="line"
-           id="tspan50126">Count</tspan></text>
-    </g>
+       id="g50124" />
     <g
        id="g50130" />
     <g
@@ -47673,18 +47654,6 @@
        id="g50136" />
     <g
        id="g50138" />
-    <g
-       id="g50140">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,660.21,703.97)"
-         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
-         id="text50144"><tspan
-           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 58.352001 66.136002 73.919998 77.811996 87.779999 95.564003 103.348 111.132 115.024 122.808 130.592 133.7 141.48399 148.48399 156.26801 164.052 167.944 171.836 183.498 191.282 196.15401 202.87399 210.658 215.32001"
-           y="0"
-           sodipodi:role="line"
-           id="tspan50142">Distance between adjacent markers</tspan></text>
-    </g>
     <g
        id="g50146" />
     <g
@@ -50048,8 +50017,8 @@
            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="path52160" />
         <path
-           d="m 796.63,21.28 v 9.44"
-           style="fill:#ff0000;stroke:#ff0000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           d="M 798.55388,-922.25909 V 38.752306"
+           style="fill:#ff0000;stroke:#ff0000;stroke-width:2.11893;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
            id="path52162" />
         <path
            d="m 825.84,21.28 v 9.44"
@@ -50370,18 +50339,6 @@
        id="g52354" />
     <g
        id="g52356" />
-    <g
-       id="g52358">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,753.88,344.47)"
-         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
-         id="text52362"><tspan
-           x="0 10.892 19.445999"
-           y="0"
-           sodipodi:role="line"
-           id="tspan52360">QTL</tspan></text>
-    </g>
     <g
        id="g52364" />
     <g
@@ -50505,10 +50462,60 @@
          sodipodi:role="line"
          id="tspan45601"
          x="147.948"
-         y="-673.91101">Reference and calculated marker map</tspan><tspan
+         y="-673.91101">Reference and calculated marker maps</tspan><tspan
          sodipodi:role="line"
          id="tspan45603"
          x="147.948"
          y="-656.41101" /></text>
+    <text
+       xml:space="preserve"
+       transform="matrix(0,1,1,0,0,0)"
+       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="text58806"
+       x="511.64026"
+       y="518.58978"><tspan
+         x="511.64026 521.63623 528.30823 532.48425 538.24426 544.91626 548.91223 552.24823 558.92023 565.59222 568.25623 572.25226"
+         y="518.58978"
+         sodipodi:role="line"
+         id="tspan58804">Marker pairs</tspan></text>
+    <g
+       id="g43547"
+       transform="translate(2.6644891e-4,2.6785441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,656.71,703.97)"
+         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text43551"><tspan
+           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 61.459999 65.351997 73.136002 80.919998 84.811996 94.779999 102.564 110.348 118.132 122.024 129.808 137.592 140.7 148.48399 155.48399 163.26801 171.052 174.944 178.836 190.498 198.282 203.15401 209.87399 217.658 222.32001"
+           y="0"
+           sodipodi:role="line"
+           id="tspan43549">Distances between adjacent markers</tspan></text>
+    </g>
+    <g
+       id="g45765"
+       transform="translate(1.75218e-5,-2.4112891e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,700.2,344.47)"
+         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text45769"><tspan
+           x="0 10.108 17.892 22.554001 30.337999 42 49.784 56.784 64.568001 76.230003 84.014 87.905998 95.690002 103.474 107.366 118.258 126.812"
+           y="0"
+           sodipodi:role="line"
+           id="tspan45767">Chromosome 12 QTL</tspan></text>
+    </g>
+    <g
+       id="g43419"
+       transform="translate(2.6569741e-4,-2.4056581e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,626.78,368.62)"
+         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="text43423"><tspan
+           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799"
+           y="0"
+           sodipodi:role="line"
+           id="tspan43421">Ratio between the calculated and the known distances</tspan></text>
+    </g>
   </g>
 </svg>
diff --git a/article/figures/figS1.pdf b/article/figures/figS1.pdf
index 2027dd31de30ce72d69a2c2fc83794d7a8fa1aee..4f7bc69b4bf29adb3121ee8162030b546b90c153 100644
Binary files a/article/figures/figS1.pdf and b/article/figures/figS1.pdf differ
diff --git a/article/figures/figS2.pdf b/article/figures/figS2.pdf
index b0c587a2b9921a4aa55ca5a8c63e0fe87eecef60..22a6b8dbd01c16b4e58ad6f7f4e37d7cfed3d39e 100644
Binary files a/article/figures/figS2.pdf and b/article/figures/figS2.pdf differ
diff --git a/article/figures/figS2prev.pdf b/article/figures/figS2prev.pdf
index 29e894c881fefca1ae576ce3b4734d0013aeea80..d47579a9a62062e1f3ec6d4df42e6cb10892c4f1 100644
Binary files a/article/figures/figS2prev.pdf and b/article/figures/figS2prev.pdf differ
diff --git a/article/figures/figS2prev.svg b/article/figures/figS2prev.svg
index 8d719eb86749b700cf23a5ce1f848347a2333b07..8a82c174fb8e2221b5134bf5544d21247424c6be 100644
--- a/article/figures/figS2prev.svg
+++ b/article/figures/figS2prev.svg
@@ -43916,9 +43916,9 @@
      inkscape:pagecheckerboard="0"
      inkscape:deskcolor="#d1d1d1"
      showgrid="true"
-     inkscape:zoom="0.62608413"
-     inkscape:cx="614.13472"
-     inkscape:cy="435.24502"
+     inkscape:zoom="0.88541667"
+     inkscape:cx="688.94117"
+     inkscape:cy="530.25882"
      inkscape:window-width="1848"
      inkscape:window-height="1016"
      inkscape:window-x="72"
@@ -127029,32 +127029,10 @@
        id="g76328" />
     <g
        id="g76330" />
-    <g
-       id="g76332">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,58.97,8.62)"
-         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="text76336"><tspan
-           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799 286.52399 295.18799 297.85199 301.18799 307.85999 311.19601 314.53201 321.20401 327.87601 331.21201 337.884 341.88 348.19199 354.19199 356.85599 363.52802 370.20001 376.20001 379.53601 389.53201 396.20401 400.38 406.14001 412.81201"
-           y="0"
-           sodipodi:role="line"
-           id="tspan76334">Ratio between the calculated and the known distance with the previous marker</tspan></text>
-    </g>
     <g
        id="g76338" />
     <g
-       id="g76340">
-      <text
-         xml:space="preserve"
-         transform="matrix(0,1,1,0,14.59,168.94)"
-         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="text76344"><tspan
-           x="0 8.6639996 15.336 22.007999 28.68"
-           y="0"
-           sodipodi:role="line"
-           id="tspan76342">Count</tspan></text>
-    </g>
+       id="g76340" />
     <g
        id="g76346" />
     <g
@@ -127065,18 +127043,6 @@
        id="g76352" />
     <g
        id="g76354" />
-    <g
-       id="g76356">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,156.21,343.97)"
-         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
-         id="text76360"><tspan
-           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 58.352001 66.136002 73.919998 77.811996 87.779999 95.564003 103.348 111.132 115.024 122.808 130.592 133.7 141.48399 148.48399 156.26801 164.052 167.944 171.836 183.498 191.282 196.15401 202.87399 210.658 215.32001"
-           y="0"
-           sodipodi:role="line"
-           id="tspan76358">Distance between adjacent markers</tspan></text>
-    </g>
     <g
        id="g76362" />
     <g
@@ -127319,32 +127285,10 @@
        id="g76612" />
     <g
        id="g76614" />
-    <g
-       id="g76616">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,562.97,8.62)"
-         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="text76620"><tspan
-           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799 286.52399 295.18799 297.85199 301.18799 307.85999 311.19601 314.53201 321.20401 327.87601 331.21201 337.884 341.88 348.19199 354.19199 356.85599 363.52802 370.20001 376.20001 379.53601 389.53201 396.20401 400.38 406.14001 412.81201"
-           y="0"
-           sodipodi:role="line"
-           id="tspan76618">Ratio between the calculated and the known distance with the previous marker</tspan></text>
-    </g>
     <g
        id="g76622" />
     <g
-       id="g76624">
-      <text
-         xml:space="preserve"
-         transform="matrix(0,1,1,0,518.59,173.27)"
-         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="text76628"><tspan
-           x="0 6.6719999 13.344 20.016001"
-           y="0"
-           sodipodi:role="line"
-           id="tspan76626">ount</tspan></text>
-    </g>
+       id="g76624" />
     <g
        id="g76630" />
     <g
@@ -127355,18 +127299,6 @@
        id="g76636" />
     <g
        id="g76638" />
-    <g
-       id="g76640">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,660.21,343.97)"
-         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
-         id="text76644"><tspan
-           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 58.352001 66.136002 73.919998 77.811996 87.779999 95.564003 103.348 111.132 115.024 122.808 130.592 133.7 141.48399 148.48399 156.26801 164.052 167.944 171.836 183.498 191.282 196.15401 202.87399 210.658 215.32001"
-           y="0"
-           sodipodi:role="line"
-           id="tspan76642">Distance between adjacent markers</tspan></text>
-    </g>
     <g
        id="g76646" />
     <g
@@ -127524,7 +127456,7 @@
          sodipodi:role="line"
          id="tspan45601"
          x="116.82563"
-         y="-673.91101">Dataset 2: reference and calculated marker map</tspan><tspan
+         y="-673.91101">Dataset 2: reference and calculated marker maps</tspan><tspan
          sodipodi:role="line"
          id="tspan45603"
          x="116.82563"
@@ -127539,7 +127471,7 @@
          sodipodi:role="line"
          id="tspan45601-2"
          x="620.448"
-         y="-673.91101">Dataset 3: reference and calculated marker map</tspan><tspan
+         y="-673.91101">Dataset 3: reference and calculated marker maps</tspan><tspan
          sodipodi:role="line"
          id="tspan45603-9"
          x="620.448"
@@ -127864,5 +127796,79 @@
            id="path153406" />
       </g>
     </g>
+    <text
+       xml:space="preserve"
+       transform="matrix(0,1,1,0,0,0)"
+       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="text115025"
+       x="151.64026"
+       y="518.58978"><tspan
+         x="151.64026 161.63626 168.30826 172.48425 178.24425 184.91626 188.91225 192.24826 198.92026 205.59225 208.25626 212.25226"
+         y="518.58978"
+         sodipodi:role="line"
+         id="tspan115023">Marker pairs</tspan></text>
+    <text
+       xml:space="preserve"
+       transform="matrix(0,1,1,0,0,0)"
+       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="text114739"
+       x="151.64026"
+       y="14.58975"><tspan
+         x="151.64026 161.63626 168.30826 172.48425 178.24426 184.91626 188.91226 192.24826 198.92026 205.59225 208.25626 212.25226"
+         y="14.58975"
+         sodipodi:role="line"
+         id="tspan114737">Marker pairs</tspan></text>
+    <g
+       id="g158742"
+       transform="translate(2.5309741e-4,2.5885441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,122.78,8.62)"
+         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="text158746"><tspan
+           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799"
+           y="0"
+           sodipodi:role="line"
+           id="tspan158744">Ratio between the calculated and the known distances</tspan></text>
+    </g>
+    <g
+       id="g158766"
+       transform="translate(2.5309741e-4,2.5885441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,152.71,343.97)"
+         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text158770"><tspan
+           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 61.459999 65.351997 73.136002 80.919998 84.811996 94.779999 102.564 110.348 118.132 122.024 129.808 137.592 140.7 148.48399 155.48399 163.26801 171.052 174.944 178.836 190.498 198.282 203.15401 209.87399 217.658 222.32001"
+           y="0"
+           sodipodi:role="line"
+           id="tspan158768">Distances between adjacent markers</tspan></text>
+    </g>
+    <g
+       id="g159028"
+       transform="translate(2.5309741e-4,2.5885441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,626.78,8.62)"
+         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="text159032"><tspan
+           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799"
+           y="0"
+           sodipodi:role="line"
+           id="tspan159030">Ratio between the calculated and the known distances</tspan></text>
+    </g>
+    <g
+       id="g159052"
+       transform="translate(2.5309741e-4,2.5885441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,656.71,343.97)"
+         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text159056"><tspan
+           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 61.459999 65.351997 73.136002 80.919998 84.811996 94.779999 102.564 110.348 118.132 122.024 129.808 137.592 140.7 148.48399 155.48399 163.26801 171.052 174.944 178.836 190.498 198.282 203.15401 209.87399 217.658 222.32001"
+           y="0"
+           sodipodi:role="line"
+           id="tspan159054">Distances between adjacent markers</tspan></text>
+    </g>
   </g>
 </svg>
diff --git a/article/figures/figS3.pdf b/article/figures/figS3.pdf
index cb5676639f745f2a430ce7ec14fb2c87d77c06df..e28e04a070e2d681b9632d558de4aa7d85870f71 100644
Binary files a/article/figures/figS3.pdf and b/article/figures/figS3.pdf differ
diff --git a/article/figures/figS3prev.pdf b/article/figures/figS3prev.pdf
index ab3f038d2d08dffa6bc59de1ed49b623422a23ee..018adab5428c1e47c27c78bf03249e21ed6ea13c 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
index 8ea516d4a5988e6858344b1e2d8f9766f8d6a68b..5d1819308249e4808bfe8e98b48a3294d0653f87 100644
--- a/article/figures/figS3prev.svg
+++ b/article/figures/figS3prev.svg
@@ -2111,10 +2111,10 @@
      inkscape:pageopacity="0.0"
      inkscape:pagecheckerboard="0"
      inkscape:deskcolor="#d1d1d1"
-     showgrid="true"
-     inkscape:zoom="0.63244048"
-     inkscape:cx="241.12941"
-     inkscape:cy="294.88941"
+     showgrid="false"
+     inkscape:zoom="0.8944059"
+     inkscape:cx="503.6863"
+     inkscape:cy="764.19442"
      inkscape:window-width="1848"
      inkscape:window-height="1016"
      inkscape:window-x="72"
@@ -6168,8 +6168,8 @@
            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="path3678" />
         <path
-           d="m 114.51,384.71 v 7.39"
-           style="fill:#ff0000;stroke:#ff0000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           d="M 114.43301,-137.94003 V 397.22668"
+           style="fill:#ff0000;stroke:#ff0000;stroke-width:1.78709;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
            id="path3680" />
         <path
            d="m 119.79,384.71 v 7.39"
@@ -6489,6 +6489,30 @@
            sodipodi:role="line"
            id="tspan3870">Peak p1</tspan></text>
     </g>
+    <g
+       id="g3868-36"
+       transform="translate(169.23058,-6.548808)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,96.67,639.67)"
+         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3872-7"><tspan
+           sodipodi:role="line"
+           id="tspan3870-5"
+           x="0"
+           y="0">Genotype at mUNC050096588 (red tick) </tspan></text>
+      <text
+         xml:space="preserve"
+         transform="scale(1,-1)"
+         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text3872-7-3"
+         x="105.42621"
+         y="-286.14453"><tspan
+           sodipodi:role="line"
+           id="tspan3870-5-5"
+           x="105.42621"
+           y="-286.14453">Genotype at SNT111392585 (red tick) </tspan></text>
+    </g>
     <g
        id="g3868-3"
        transform="translate(-63.861999,23.120328)">
@@ -6500,7 +6524,7 @@
            x="0"
            y="0"
            sodipodi:role="line"
-           id="tspan3870-7">Case1: peak on a single marker with non-Mendelian proportions (peaks 1 and 2)</tspan></text>
+           id="tspan3870-7">Peak on a single marker (red) with non-Mendelian proportions (peaks 1 and 2)</tspan></text>
     </g>
     <g
        id="g3868-3-5"
@@ -6513,7 +6537,7 @@
            x="0"
            y="0"
            sodipodi:role="line"
-           id="tspan3870-7-5">Case2: peak on a peudomarker adjacent to a marker with non-Mendelian proportions (peaks 3 and 4)</tspan></text>
+           id="tspan3870-7-5">Peak on a peudomarker adjacent to a marker (red) with non-Mendelian proportions (peaks 3 and 4)</tspan></text>
     </g>
     <g
        id="g3874" />
@@ -6533,7 +6557,7 @@
        id="g3888" />
     <g
        id="g3890"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3892"
          clip-path="url(#clipPath3896)">
@@ -6547,7 +6571,7 @@
        id="g3900" />
     <g
        id="g3902"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3904"
          clip-path="url(#clipPath3908)">
@@ -6561,7 +6585,7 @@
        id="g3912" />
     <g
        id="g3914"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3916"
          clip-path="url(#clipPath3920)">
@@ -6575,7 +6599,7 @@
        id="g3924" />
     <g
        id="g3926"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3928"
          clip-path="url(#clipPath3932)">
@@ -6589,7 +6613,7 @@
        id="g3936" />
     <g
        id="g3938"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3940"
          clip-path="url(#clipPath3944)">
@@ -6603,7 +6627,7 @@
        id="g3948" />
     <g
        id="g3950"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3952"
          clip-path="url(#clipPath3956)">
@@ -6617,7 +6641,7 @@
        id="g3960" />
     <g
        id="g3962"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3964"
          clip-path="url(#clipPath3968)">
@@ -6631,7 +6655,7 @@
        id="g3972" />
     <g
        id="g3974"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3976"
          clip-path="url(#clipPath3980)">
@@ -6645,7 +6669,7 @@
        id="g3984" />
     <g
        id="g3986"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g3988"
          clip-path="url(#clipPath3992)">
@@ -6659,7 +6683,7 @@
        id="g3996" />
     <g
        id="g3998"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4000"
          clip-path="url(#clipPath4004)">
@@ -6673,7 +6697,7 @@
        id="g4008" />
     <g
        id="g4010"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4012"
          clip-path="url(#clipPath4016)">
@@ -6687,7 +6711,7 @@
        id="g4020" />
     <g
        id="g4022"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4024"
          clip-path="url(#clipPath4028)">
@@ -6701,7 +6725,7 @@
        id="g4032" />
     <g
        id="g4034"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4036"
          clip-path="url(#clipPath4040)">
@@ -6715,7 +6739,7 @@
        id="g4044" />
     <g
        id="g4046"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4048"
          clip-path="url(#clipPath4052)">
@@ -6729,7 +6753,7 @@
        id="g4056" />
     <g
        id="g4058"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4060"
          clip-path="url(#clipPath4064)">
@@ -6743,7 +6767,7 @@
        id="g4068" />
     <g
        id="g4070"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4072"
          clip-path="url(#clipPath4076)">
@@ -6757,7 +6781,7 @@
        id="g4080" />
     <g
        id="g4082"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4084"
          clip-path="url(#clipPath4088)">
@@ -6771,7 +6795,7 @@
        id="g4092" />
     <g
        id="g4094"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4096"
          clip-path="url(#clipPath4100)">
@@ -6785,7 +6809,7 @@
        id="g4104" />
     <g
        id="g4106"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4108"
          clip-path="url(#clipPath4112)">
@@ -6804,7 +6828,7 @@
        id="g4118" />
     <g
        id="g4120"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4122"
          clip-path="url(#clipPath4126)">
@@ -6823,7 +6847,7 @@
        id="g4132" />
     <g
        id="g4134"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4136"
          clip-path="url(#clipPath4140)">
@@ -6842,7 +6866,7 @@
        id="g4146" />
     <g
        id="g4148"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4150"
          clip-path="url(#clipPath4154)">
@@ -6860,7 +6884,7 @@
        id="g4160" />
     <g
        id="g4162"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4164"
          clip-path="url(#clipPath4168)">
@@ -6879,7 +6903,7 @@
        id="g4174" />
     <g
        id="g4176"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4178"
          clip-path="url(#clipPath4182)">
@@ -6898,7 +6922,7 @@
        id="g4188" />
     <g
        id="g4190"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4192"
          clip-path="url(#clipPath4196)">
@@ -6925,7 +6949,7 @@
        id="g4206" />
     <g
        id="g4208"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4210"
          clip-path="url(#clipPath4214)">
@@ -6943,7 +6967,7 @@
        id="g4220" />
     <g
        id="g4222"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4224"
          clip-path="url(#clipPath4228)">
@@ -6970,7 +6994,7 @@
        id="g4238" />
     <g
        id="g4240"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4242"
          clip-path="url(#clipPath4246)">
@@ -6988,7 +7012,7 @@
        id="g4252" />
     <g
        id="g4254"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4256"
          clip-path="url(#clipPath4260)">
@@ -7015,7 +7039,7 @@
        id="g4270" />
     <g
        id="g4272"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4274"
          clip-path="url(#clipPath4278)">
@@ -7033,7 +7057,7 @@
        id="g4284" />
     <g
        id="g4286"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4288"
          clip-path="url(#clipPath4292)">
@@ -7060,7 +7084,7 @@
        id="g4302" />
     <g
        id="g4304"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4306"
          clip-path="url(#clipPath4310)">
@@ -7078,7 +7102,7 @@
        id="g4316" />
     <g
        id="g4318"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4320"
          clip-path="url(#clipPath4324)">
@@ -7105,7 +7129,7 @@
        id="g4334" />
     <g
        id="g4336"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4338"
          clip-path="url(#clipPath4342)">
@@ -7124,7 +7148,7 @@
        id="g4348" />
     <g
        id="g4350"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4352"
          clip-path="url(#clipPath4356)">
@@ -7151,7 +7175,7 @@
        id="g4366" />
     <g
        id="g4368"
-       transform="translate(0,98.520016)">
+       transform="translate(0,83.520016)">
       <g
          id="g4370"
          clip-path="url(#clipPath4374)">
@@ -7271,8 +7295,8 @@
            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 117.41,31.91 V 39.3"
-           style="fill:none;stroke:#ff0000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           d="M 118.59112,-462.8395 V 44.150136"
+           style="fill:none;stroke:#ff0000;stroke-width:1.73938;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
            id="path4454" />
         <path
            d="M 120.85,31.91 V 39.3"
@@ -7280,7 +7304,7 @@
            id="path4456" />
         <path
            d="M 130.05,31.91 V 39.3"
-           style="fill:none;stroke:#ff0000;stroke-width:0.21;stroke-linecap:round;stroke-linejoin:round;stroke-miterlimit:10;stroke-dasharray:none;stroke-opacity:1"
+           style="fill:#000000;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 136.26,31.91 V 39.3"
@@ -7604,7 +7628,7 @@
        id="g4658" />
     <g
        id="g4660"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4662"
          clip-path="url(#clipPath4666)">
@@ -7618,7 +7642,7 @@
        id="g4670" />
     <g
        id="g4672"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4674"
          clip-path="url(#clipPath4678)">
@@ -7632,7 +7656,7 @@
        id="g4682" />
     <g
        id="g4684"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4686"
          clip-path="url(#clipPath4690)">
@@ -7646,7 +7670,7 @@
        id="g4694" />
     <g
        id="g4696"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4698"
          clip-path="url(#clipPath4702)">
@@ -7660,7 +7684,7 @@
        id="g4706" />
     <g
        id="g4708"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4710"
          clip-path="url(#clipPath4714)">
@@ -7674,7 +7698,7 @@
        id="g4718" />
     <g
        id="g4720"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4722"
          clip-path="url(#clipPath4726)">
@@ -7688,7 +7712,7 @@
        id="g4730" />
     <g
        id="g4732"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4734"
          clip-path="url(#clipPath4738)">
@@ -7702,7 +7726,7 @@
        id="g4742" />
     <g
        id="g4744"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4746"
          clip-path="url(#clipPath4750)">
@@ -7716,7 +7740,7 @@
        id="g4754" />
     <g
        id="g4756"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4758"
          clip-path="url(#clipPath4762)">
@@ -7730,7 +7754,7 @@
        id="g4766" />
     <g
        id="g4768"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4770"
          clip-path="url(#clipPath4774)">
@@ -7747,18 +7771,13 @@
        transform="translate(0,88.540007)">
       <g
          id="g4782"
-         clip-path="url(#clipPath4786)">
-        <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="path4788" />
-      </g>
+         clip-path="url(#clipPath4786)" />
     </g>
     <g
        id="g4790" />
     <g
        id="g4792"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4794"
          clip-path="url(#clipPath4798)">
@@ -7770,23 +7789,11 @@
     </g>
     <g
        id="g4802" />
-    <g
-       id="g4804"
-       transform="translate(0,88.540007)">
-      <g
-         id="g4806"
-         clip-path="url(#clipPath4810)">
-        <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="path4812" />
-      </g>
-    </g>
     <g
        id="g4814" />
     <g
        id="g4816"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4818"
          clip-path="url(#clipPath4822)">
@@ -7798,23 +7805,11 @@
     </g>
     <g
        id="g4826" />
-    <g
-       id="g4828"
-       transform="translate(0,88.540007)">
-      <g
-         id="g4830"
-         clip-path="url(#clipPath4834)">
-        <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="path4836" />
-      </g>
-    </g>
     <g
        id="g4838" />
     <g
        id="g4840"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4842"
          clip-path="url(#clipPath4846)">
@@ -7826,23 +7821,11 @@
     </g>
     <g
        id="g4850" />
-    <g
-       id="g4852"
-       transform="translate(0,88.540007)">
-      <g
-         id="g4854"
-         clip-path="url(#clipPath4858)">
-        <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="path4860" />
-      </g>
-    </g>
     <g
        id="g4862" />
     <g
        id="g4864"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4866"
          clip-path="url(#clipPath4870)">
@@ -7854,23 +7837,11 @@
     </g>
     <g
        id="g4874" />
-    <g
-       id="g4876"
-       transform="translate(0,88.540007)">
-      <g
-         id="g4878"
-         clip-path="url(#clipPath4882)">
-        <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="path4884" />
-      </g>
-    </g>
     <g
        id="g4886" />
     <g
        id="g4888"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4890"
          clip-path="url(#clipPath4894)">
@@ -7882,23 +7853,11 @@
     </g>
     <g
        id="g4898" />
-    <g
-       id="g4900"
-       transform="translate(0,88.540007)">
-      <g
-         id="g4902"
-         clip-path="url(#clipPath4906)">
-        <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="path4908" />
-      </g>
-    </g>
     <g
        id="g4910" />
     <g
        id="g4912"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4914"
          clip-path="url(#clipPath4918)">
@@ -7910,23 +7869,11 @@
     </g>
     <g
        id="g4922" />
-    <g
-       id="g4924"
-       transform="translate(0,88.540007)">
-      <g
-         id="g4926"
-         clip-path="url(#clipPath4930)">
-        <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="path4932" />
-      </g>
-    </g>
     <g
        id="g4934" />
     <g
        id="g4936"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4938"
          clip-path="url(#clipPath4942)">
@@ -7938,23 +7885,11 @@
     </g>
     <g
        id="g4946" />
-    <g
-       id="g4948"
-       transform="translate(0,88.540007)">
-      <g
-         id="g4950"
-         clip-path="url(#clipPath4954)">
-        <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="path4956" />
-      </g>
-    </g>
     <g
        id="g4958" />
     <g
        id="g4960"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4962"
          clip-path="url(#clipPath4966)">
@@ -7966,23 +7901,11 @@
     </g>
     <g
        id="g4970" />
-    <g
-       id="g4972"
-       transform="translate(0,88.540007)">
-      <g
-         id="g4974"
-         clip-path="url(#clipPath4978)">
-        <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="path4980" />
-      </g>
-    </g>
     <g
        id="g4982" />
     <g
        id="g4984"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g4986"
          clip-path="url(#clipPath4990)">
@@ -8001,7 +7924,7 @@
        id="g4996" />
     <g
        id="g4998"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5000"
          clip-path="url(#clipPath5004)">
@@ -8020,7 +7943,7 @@
        id="g5010" />
     <g
        id="g5012"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5014"
          clip-path="url(#clipPath5018)">
@@ -8037,28 +7960,11 @@
     </g>
     <g
        id="g5024" />
-    <g
-       id="g5026"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5028"
-         clip-path="url(#clipPath5032)">
-        <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="text5036"><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="tspan5034">mJAX00308021</tspan></text>
-      </g>
-    </g>
     <g
        id="g5038" />
     <g
        id="g5040"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5042"
          clip-path="url(#clipPath5046)">
@@ -8077,7 +7983,7 @@
        id="g5052" />
     <g
        id="g5054"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5056"
          clip-path="url(#clipPath5060)">
@@ -8096,7 +8002,7 @@
        id="g5066" />
     <g
        id="g5068"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5070"
          clip-path="url(#clipPath5074)">
@@ -8121,28 +8027,11 @@
     </g>
     <g
        id="g5084" />
-    <g
-       id="g5086"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5088"
-         clip-path="url(#clipPath5092)">
-        <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="text5096"><tspan
-             x="0 6.6719999"
-             y="0"
-             sodipodi:role="line"
-             id="tspan5094">11</tspan></text>
-      </g>
-    </g>
     <g
        id="g5098" />
     <g
        id="g5100"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5102"
          clip-path="url(#clipPath5106)">
@@ -8169,7 +8058,7 @@
        id="g5116" />
     <g
        id="g5118"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5120"
          clip-path="url(#clipPath5124)">
@@ -8188,7 +8077,7 @@
        id="g5130" />
     <g
        id="g5132"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5134"
          clip-path="url(#clipPath5138)">
@@ -8213,28 +8102,11 @@
     </g>
     <g
        id="g5148" />
-    <g
-       id="g5150"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5152"
-         clip-path="url(#clipPath5156)">
-        <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="text5160"><tspan
-             x="0 6.6719999 13.344 16.68 23.351999 30.024"
-             y="0"
-             sodipodi:role="line"
-             id="tspan5158">21.558</tspan></text>
-      </g>
-    </g>
     <g
        id="g5162" />
     <g
        id="g5164"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5166"
          clip-path="url(#clipPath5170)">
@@ -8261,7 +8133,7 @@
        id="g5180" />
     <g
        id="g5182"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5184"
          clip-path="url(#clipPath5188)">
@@ -8279,7 +8151,7 @@
        id="g5194" />
     <g
        id="g5196"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5198"
          clip-path="url(#clipPath5202)">
@@ -8304,27 +8176,11 @@
     </g>
     <g
        id="g5212" />
-    <g
-       id="g5214"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5216"
-         clip-path="url(#clipPath5220)">
-        <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="text5224"><tspan
-             x="0"
-             y="0"
-             id="tspan5222">T</tspan></text>
-      </g>
-    </g>
     <g
        id="g5226" />
     <g
        id="g5228"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5230"
          clip-path="url(#clipPath5234)">
@@ -8351,7 +8207,7 @@
        id="g5244" />
     <g
        id="g5246"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5248"
          clip-path="url(#clipPath5252)">
@@ -8367,27 +8223,11 @@
     </g>
     <g
        id="g5258" />
-    <g
-       id="g5260"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5262"
-         clip-path="url(#clipPath5266)">
-        <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="text5270"><tspan
-             x="0"
-             y="0"
-             id="tspan5268">G</tspan></text>
-      </g>
-    </g>
     <g
        id="g5272" />
     <g
        id="g5274"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5276"
          clip-path="url(#clipPath5280)">
@@ -8403,28 +8243,11 @@
     </g>
     <g
        id="g5286" />
-    <g
-       id="g5288"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5290"
-         clip-path="url(#clipPath5294)">
-        <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="text5298"><tspan
-             x="0 6.6719999"
-             y="0"
-             sodipodi:role="line"
-             id="tspan5296">14</tspan></text>
-      </g>
-    </g>
     <g
        id="g5300" />
     <g
        id="g5302"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5304"
          clip-path="url(#clipPath5308)">
@@ -8441,28 +8264,11 @@
     </g>
     <g
        id="g5314" />
-    <g
-       id="g5316"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5318"
-         clip-path="url(#clipPath5322)">
-        <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="text5326"><tspan
-             x="0 6.6719999"
-             y="0"
-             sodipodi:role="line"
-             id="tspan5324">24</tspan></text>
-      </g>
-    </g>
     <g
        id="g5328" />
     <g
        id="g5330"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5332"
          clip-path="url(#clipPath5336)">
@@ -8478,28 +8284,11 @@
     </g>
     <g
        id="g5342" />
-    <g
-       id="g5344"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5346"
-         clip-path="url(#clipPath5350)">
-        <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="text5354"><tspan
-             x="0 6.6719999"
-             y="0"
-             sodipodi:role="line"
-             id="tspan5352">52</tspan></text>
-      </g>
-    </g>
     <g
        id="g5356" />
     <g
        id="g5358"
-       transform="translate(0,88.540007)">
+       transform="translate(0,73.540007)">
       <g
          id="g5360"
          clip-path="url(#clipPath5364)">
@@ -8515,22 +8304,6 @@
     </g>
     <g
        id="g5370" />
-    <g
-       id="g5372"
-       transform="translate(0,88.540007)">
-      <g
-         id="g5374"
-         clip-path="url(#clipPath5378)">
-        <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="text5382"><tspan
-             x="0"
-             y="0"
-             id="tspan5380">4</tspan></text>
-      </g>
-    </g>
     <g
        id="g5384" />
     <g
@@ -8565,11 +8338,13 @@
            id="tspan5400">C</tspan></text>
       <text
          xml:space="preserve"
-         transform="matrix(1,0,0,-1,221.78,637.97)"
+         transform="scale(1,-1)"
          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="text5406"><tspan
-           x="0"
-           y="0"
+         id="text5406"
+         x="241.28"
+         y="-637.96997"><tspan
+           x="241.28"
+           y="-637.96997"
            id="tspan5404">D</tspan></text>
       <text
          xml:space="preserve"
@@ -8581,11 +8356,13 @@
            id="tspan5408">E</tspan></text>
       <text
          xml:space="preserve"
-         transform="matrix(1,0,0,-1,220.89,285.17)"
+         transform="scale(1,-1)"
          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="text5414"><tspan
-           x="0"
-           y="0"
+         id="text5414"
+         x="240.39"
+         y="-285.17001"><tspan
+           x="240.39"
+           y="-285.17001"
            id="tspan5412">F</tspan></text>
     </g>
     <g
diff --git a/article/figures/figS4.pdf b/article/figures/figS4.pdf
index 91be4aca2143226687e2df57729139bf81304273..11d60045cbe2c09e2b92fc2c1a335912cd856447 100644
Binary files a/article/figures/figS4.pdf and b/article/figures/figS4.pdf differ
diff --git a/article/figures/figS4prev.pdf b/article/figures/figS4prev.pdf
index 39b854afe6abed289f416a5e24553313109729d2..ff67b2c767fed9b346d3e7c00d79b3f12701570b 100644
Binary files a/article/figures/figS4prev.pdf and b/article/figures/figS4prev.pdf differ
diff --git a/article/figures/figS4prev.svg b/article/figures/figS4prev.svg
index da6a7ae69495a95d99dd02ef0bb4ab662c3ed868..c0fd9aeee6143ebe2720eee632b2abf337a4f1e3 100644
--- a/article/figures/figS4prev.svg
+++ b/article/figures/figS4prev.svg
@@ -38513,8 +38513,8 @@
      inkscape:deskcolor="#d1d1d1"
      showgrid="false"
      inkscape:zoom="0.62608413"
-     inkscape:cx="789.82996"
-     inkscape:cy="583.78736"
+     inkscape:cx="676.42666"
+     inkscape:cy="376.14753"
      inkscape:window-width="1848"
      inkscape:window-height="1016"
      inkscape:window-x="72"
@@ -111483,6 +111483,17 @@
            id="path211334" />
       </g>
     </g>
+    <text
+       xml:space="preserve"
+       transform="matrix(0,1,1,0,0,0)"
+       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="text101022"
+       x="151.64026"
+       y="14.58975"><tspan
+         x="151.64026 161.63625 168.30826 172.48425 178.24425 184.91626 188.91225 192.24826 198.92026 205.59225 208.25626 212.25226"
+         y="14.58975"
+         sodipodi:role="line"
+         id="tspan101020">Marker pairs</tspan></text>
     <g
        id="g211336" />
     <g
@@ -111826,32 +111837,10 @@
        id="g211538" />
     <g
        id="g211540" />
-    <g
-       id="g211542">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,58.97,8.62)"
-         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="text211546"><tspan
-           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799 286.52399 295.18799 297.85199 301.18799 307.85999 311.19601 314.53201 321.20401 327.87601 331.21201 337.884 341.88 348.19199 354.19199 356.85599 363.52802 370.20001 376.20001 379.53601 389.53201 396.20401 400.38 406.14001 412.81201"
-           y="0"
-           sodipodi:role="line"
-           id="tspan211544">Ratio between the calculated and the known distance with the previous marker</tspan></text>
-    </g>
     <g
        id="g211548" />
     <g
-       id="g211550">
-      <text
-         xml:space="preserve"
-         transform="matrix(0,1,1,0,14.59,168.94)"
-         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="text211554"><tspan
-           x="0 8.6639996 15.336 22.007999 28.68"
-           y="0"
-           sodipodi:role="line"
-           id="tspan211552">Count</tspan></text>
-    </g>
+       id="g211550" />
     <g
        id="g211556" />
     <g
@@ -111862,18 +111851,6 @@
        id="g211562" />
     <g
        id="g211564" />
-    <g
-       id="g211566">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,156.21,343.97)"
-         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
-         id="text211570"><tspan
-           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 58.352001 66.136002 73.919998 77.811996 87.779999 95.564003 103.348 111.132 115.024 122.808 130.592 133.7 141.48399 148.48399 156.26801 164.052 167.944 171.836 183.498 191.282 196.15401 202.87399 210.658 215.32001"
-           y="0"
-           sodipodi:role="line"
-           id="tspan211568">Distance between adjacent markers</tspan></text>
-    </g>
     <g
        id="g211572" />
     <g
@@ -112284,32 +112261,8 @@
        id="g211828" />
     <g
        id="g211830" />
-    <g
-       id="g211832">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,562.97,8.62)"
-         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="text211836"><tspan
-           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799 286.52399 295.18799 297.85199 301.18799 307.85999 311.19601 314.53201 321.20401 327.87601 331.21201 337.884 341.88 348.19199 354.19199 356.85599 363.52802 370.20001 376.20001 379.53601 389.53201 396.20401 400.38 406.14001 412.81201"
-           y="0"
-           sodipodi:role="line"
-           id="tspan211834">Ratio between the calculated and the known distance with the previous marker</tspan></text>
-    </g>
     <g
        id="g211838" />
-    <g
-       id="g211840">
-      <text
-         xml:space="preserve"
-         transform="matrix(0,1,1,0,518.59,168.94)"
-         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="text211844"><tspan
-           x="0 8.6639996 15.336 22.007999 28.68"
-           y="0"
-           sodipodi:role="line"
-           id="tspan211842">Count</tspan></text>
-    </g>
     <g
        id="g211846" />
     <g
@@ -112320,18 +112273,6 @@
        id="g211852" />
     <g
        id="g211854" />
-    <g
-       id="g211856">
-      <text
-         xml:space="preserve"
-         transform="matrix(1,0,0,-1,660.21,343.97)"
-         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
-         id="text211860"><tspan
-           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 58.352001 66.136002 73.919998 77.811996 87.779999 95.564003 103.348 111.132 115.024 122.808 130.592 133.7 141.48399 148.48399 156.26801 164.052 167.944 171.836 183.498 191.282 196.15401 202.87399 210.658 215.32001"
-           y="0"
-           sodipodi:role="line"
-           id="tspan211858">Distance between adjacent markers</tspan></text>
-    </g>
     <g
        id="g211862" />
     <g
@@ -112455,7 +112396,7 @@
          sodipodi:role="line"
          id="tspan45601"
          x="116.82575"
-         y="-673.91101">Dataset 2: reference and calculated marker map</tspan><tspan
+         y="-673.91101">Dataset 2: reference and calculated marker maps</tspan><tspan
          sodipodi:role="line"
          id="tspan45603"
          x="116.82575"
@@ -112470,10 +112411,75 @@
          sodipodi:role="line"
          id="tspan45601-2"
          x="620.44812"
-         y="-673.91101">Dataset 3: reference and calculated marker map</tspan><tspan
+         y="-673.91101">Dataset 3: reference and calculated marker maps</tspan><tspan
          sodipodi:role="line"
          id="tspan45603-9"
          x="620.44812"
          y="-656.41101" /></text>
+    <g
+       id="g101308"
+       transform="translate(-2.3725396e-4,2.5593229e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(0,1,1,0,518.59,151.64)"
+         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="text101312"><tspan
+           x="0 9.9960003 16.667999 20.844 26.604 33.276001 37.271999 40.608002 47.279999 53.952 56.616001 60.612"
+           y="0"
+           sodipodi:role="line"
+           id="tspan101310">Marker pairs</tspan></text>
+    </g>
+    <g
+       id="g101010"
+       transform="translate(2.5309741e-4,2.5885441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,122.78,8.62)"
+         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="text101014"><tspan
+           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799"
+           y="0"
+           sodipodi:role="line"
+           id="tspan101012">Ratio between the calculated and the known distances</tspan></text>
+    </g>
+    <g
+       id="g101034"
+       transform="translate(2.5309741e-4,2.5885441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,152.71,343.97)"
+         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text101038"><tspan
+           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 61.459999 65.351997 73.136002 80.919998 84.811996 94.779999 102.564 110.348 118.132 122.024 129.808 137.592 140.7 148.48399 155.48399 163.26801 171.052 174.944 178.836 190.498 198.282 203.15401 209.87399 217.658 222.32001"
+           y="0"
+           sodipodi:role="line"
+           id="tspan101036">Distances between adjacent markers</tspan></text>
+    </g>
+    <g
+       id="g101300"
+       transform="translate(2.5309741e-4,2.5885441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,626.78,8.62)"
+         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="text101304"><tspan
+           x="0 8.6639996 15.336 18.672001 21.336 28.007999 31.344 38.015999 44.688 48.023998 56.568001 63.240002 69.912003 76.584 79.919998 83.255997 89.928001 96.599998 99.935997 105.936 112.608 115.272 121.272 127.944 130.608 137.28 140.616 147.28799 153.96001 157.29601 163.968 170.64 177.312 180.64799 183.98399 190.65601 197.328 200.664 206.664 213.336 219.828 228.492 235.164 238.5 245.172 247.836 253.836 257.172 263.84399 270.51599 276.51599 283.18799"
+           y="0"
+           sodipodi:role="line"
+           id="tspan101302">Ratio between the calculated and the known distances</tspan></text>
+    </g>
+    <g
+       id="g101324"
+       transform="translate(2.5309741e-4,2.5885441e-4)">
+      <text
+         xml:space="preserve"
+         transform="matrix(1,0,0,-1,656.71,343.97)"
+         style="font-variant:normal;font-weight:normal;font-size:14px;font-family:Helvetica;-inkscape-font-specification:Helvetica;writing-mode:lr-tb;fill:#000000;fill-opacity:1;fill-rule:nonzero;stroke:none"
+         id="text101328"><tspan
+           x="0 10.108 13.216 20.216 24.108 31.892 39.675999 46.675999 54.459999 61.459999 65.351997 73.136002 80.919998 84.811996 94.779999 102.564 110.348 118.132 122.024 129.808 137.592 140.7 148.48399 155.48399 163.26801 171.052 174.944 178.836 190.498 198.282 203.15401 209.87399 217.658 222.32001"
+           y="0"
+           sodipodi:role="line"
+           id="tspan101326">Distances between adjacent markers</tspan></text>
+    </g>
   </g>
 </svg>
diff --git a/article/figures/figS5.pdf b/article/figures/figS5.pdf
index 64f97119f1171cebfc2c709e3266f09952970b5b..2d0e39e39cc1530b0a5e294ab44827f243f2e059 100644
Binary files a/article/figures/figS5.pdf and b/article/figures/figS5.pdf differ