Browse Source

fixing merge

alecristia 1 month ago
parent
commit
e2820a8ba9
13 changed files with 575 additions and 1121 deletions
  1. 95 46
      CODE/SM.Rmd
  2. 397 275
      CODE/SM.html
  3. 0 759
      CODE/SM.log
  4. 5 3
      CODE/create-all-rs.R
  5. BIN
      CODE/fig1.png
  6. BIN
      CODE/fig4.png
  7. BIN
      CODE/fig5.png
  8. BIN
      CODE/fig6.png
  9. BIN
      CODE/fig7.png
  10. BIN
      CODE/fig8.png
  11. BIN
      CODE/fig9.png
  12. 0 38
      CODE/sessionInfo.txt
  13. 78 0
      data_output/all_rs.csv

+ 95 - 46
CODE/SM.Rmd

@@ -107,7 +107,7 @@ if(RECALC) source("create-all-rs.R")
 
 ```{r readin}
 
-df.icc.simu <- read.csv("../OUTPUT/df.icc.simu.csv") #365 rows because there are multiple rows per metric as a function of r
+df.icc.simu <- read.csv("../OUTPUT/df.icc.simu.csv") #375 rows because there are multiple rows per metric as a function of r
 
 mydat_aclew <- read.csv(paste0('../data_output/', 'aclew','_metrics_scaled.csv')) 
 mydat_aclew <- mydat_aclew[is.element(mydat_aclew$experiment, corpora),]
@@ -126,7 +126,7 @@ mydat2 <- read.csv("../data_output/dat_sib_ana.csv")
 
 df.icc.age<-read.csv("../OUTPUT/df.icc.age.csv")
 age_levels=c("(0,6]" , "(6,12]",  "(12,18]" ,"(18,24]" ,"(24,30]", "(30,36]" )
-#not present in data: , "(36,42]", "(42,48]", "(48,54]"
+#not present in data because no repeated recs at these ages: , "(36,42]", "(42,48]", "(48,54]"
 df.icc.age$age_bin<-factor(df.icc.age$age_bin,levels=age_levels)
 df.icc.age$Type<-get_type(df.icc.age)
 
@@ -152,7 +152,7 @@ In the simulation, we departed from reality as follows:
 - we did not consider child age, nor variable re-recording periods
 - we had a single pair of recordings (rather than variable number of re-recordings)
 
-We used simstudy, a package created for such simulations, following the vignette https://cran.r-project.org/web/packages/simstudy/vignettes/correlated.html to create correlated data providing a correlation matrix. Results are shown in the Figure below. Each point represents the ICC extracted from a mixed model applied to one metric, combining data from all corpora. It appears that ICC values reflect underlying r values, but underestimating r more the larger r is. 
+We used simstudy, a package created for such simulations, following the vignette https://cran.r-project.org/web/packages/simstudy/vignettes/correlated.html to create correlated data providing a correlation matrix. Results are shown in the Figure below. Each point represents the ICC extracted from a mixed model applied to one metric, combining data from all corpora. **It appears that ICC values reflect underlying r values, but underestimating r more the larger r is.** 
 
 ```{r icc-sim-plot, fig.cap="Results from simulations aimed at helping understand the relationship between underlying r and estimated ICC."}
 
@@ -241,6 +241,8 @@ nrecs=length(levels(mydat_aclew$session_id))
 
 Please see code in the RMarkDown version of the document.
 
+> A variable with one of the lowest Child ICC (LENA's peak hourly AWC, Child ICC = `r round(df.icc.mixed[df.icc.mixed$data_set=="lena" & df.icc.mixed$metric=="peak_wc_adu","icc_child_id"],2)`) has a flatter regression line and wider confidence intervals, with points spread widely around the regression line. In contrast, the variable with the highest Child ICC (ACLEW's other child vocalization duration, Child ICC = `r round(df.icc.mixed[df.icc.mixed$data_set=="aclew" & df.icc.mixed$metric=="voc_och_ph","icc_child_id"],2)`) has points that are less scattered and closer to the diagonal. 
+
 
 ```{r icc-examples-fig1,  fig.width=6, fig.height=4.5,fig.cap="Figure 2 (reproduced). Scatterplots for two selected variables. The left one has relatively low ICCs; the right one has relatively higher ICCs."}
 # figure of bad ICC: lena     used to be: avg_voc_dur_chi, now is: peak_wc_adu_ph; good ICC: lena used to be: voc_och_ph, now is: voc_dur_och_ph
@@ -312,9 +314,14 @@ fig2 = ggarrange(bad, good,
           font.label = list(size = 20))  + labs(color= "Corpus")  +  theme(text = element_text(size = 20))
 fig2 
 
+<<<<<<< HEAD
 ggsave("../output/fig2.png", plot = fig2, width = 6, height = 4.5, units = "in")
+=======
+ggsave("fig1.png", plot = fig2, width = 6, height = 4.5, units = "in")
+>>>>>>> origin/master
 ```
 
+
 ## SM E: Code to reproduce text at the beginning of the "Setting the stage" section
 
 Please see code in the RMarkDown version of the document.
@@ -377,17 +384,33 @@ reg_anova_cor=Anova(lr_cor)
 r_msds=aggregate(rval_tab$m,by=list(rval_tab$data_set),get_msd)
 rownames(r_msds)<-r_msds$Group.1
 
-cor_t=t.test(rval_tab$m ~ rval_tab$data_set)
+
+r_msds_type=aggregate(rval_tab$m,by=list(rval_tab$Type),get_msd)
+rownames(r_msds_type)<-r_msds_type$Group.1
+
+cor_t=t.test(rval_tab$m[rval_tab$Type %in% c("Other children","Adults")] ~ rval_tab$Type[rval_tab$Type %in% c("Other children","Adults")]) #marginal
+
+cor_t=t.test(rval_tab$m[rval_tab$Type %in% c("Other children","Male")] ~ rval_tab$Type[rval_tab$Type %in% c("Other children","Male")]) #sig
+
+cor_t=t.test(rval_tab$m[rval_tab$Type %in% c("Other children","Female")] ~ rval_tab$Type[rval_tab$Type %in% c("Other children","Female")]) #sig
+
+cor_t=t.test(rval_tab$m[rval_tab$Type %in% c("Other children","Output")] ~ rval_tab$Type[rval_tab$Type %in% c("Other children","Output")]) #not sig
+
+cor_t=t.test(rval_tab$m[rval_tab$Type %in% c("Male","Output")] ~ rval_tab$Type[rval_tab$Type %in% c("Male","Output")]) #sig
+
+cor_t=t.test(rval_tab$m[rval_tab$Type %in% c("Female","Output")] ~ rval_tab$Type[rval_tab$Type %in% c("Female","Output")]) #sig
+
+cor_t=t.test(rval_tab$m[rval_tab$Type %in% c("Adults","Output")] ~ rval_tab$Type[rval_tab$Type %in% c("Adults","Output")]) #not sig
 
 ```
 
-> To see whether correlations in this analysis differed by talker types and pipelines, we fit a linear model with the formula $lm(cor ~ type * pipeline)$, where type indicates whether the measure pertained to the key child, (female/male) adults, other children; and pipeline LENA or ACLEW. The model was overall significant (F(`r round(reg_sum_cor$fstatistic["dendf"],2)`) = `r round(reg_sum_cor$fstatistic["value"],2)`, p < .001). We found an adjusted R-squared of `r round(reg_sum_cor$adj.r.squared*100)`%, suggesting this model did not explain a great deal of variance in correlation coefficients. A Type 3 ANOVA on this model revealed a significant effect of pipeline (F = `r round(reg_anova_cor["data_set","F value"],2)`, p = `r round(reg_anova_cor["data_set","Pr(>F)"],2)`), due to higher correlations for ACLEW (`r r_msds["aclew","x"]`) than for LENA metrics (m = `r r_msds["lena","x"]`). 
+> To see whether correlations in this analysis differed by talker types and pipelines, we fit a linear model with the formula $lm(cor ~ type * pipeline)$, where type indicates whether the measure pertained to the key child, (female/male) adults, other children; and pipeline LENA or ACLEW. The model was overall significant (F(`r round(reg_sum_cor$fstatistic["dendf"],2)`) = `r round(reg_sum_cor$fstatistic["value"],2)`, p < .001). We found an adjusted R-squared of `r round(reg_sum_cor$adj.r.squared*100)`%. A Type 3 ANOVA on this model revealed   a significant effect of type (F = `r round(reg_anova_cor["Type","F value"],2)`, p < .001), with higher correlations for other children metrics (`r r_msds_type["Other children","x"]`) and output metrics (`r r_msds_type["Output","x"]`) than female (`r r_msds_type["Female","x"]`), and male (`r r_msds_type["Male","x"]`) metrics. There was also a marginal effect of pipeline (F = `r round(reg_anova_cor["data_set","F value"],2)`, p = `r round(reg_anova_cor["data_set","Pr(>F)"],2)`), with numerically higher correlations  for ACLEW (`r r_msds["aclew","x"]`) than for LENA metrics (`r r_msds["lena","x"]`). 
 
 See table below for results of the Type 3 ANOVA.
 
 ```{r print out anova results rec on cor}
 
-kable(round(reg_anova_cor,2),caption="Type 3 ANOVA on model attempting to explain variation in Child ICC as a function of talker types and pipelines.")
+kable(round(reg_anova_cor,2),caption="Type 3 ANOVA on model attempting to explain variation in Correlations as a function of talker types and pipelines.")
 ```
 
 
@@ -436,15 +459,39 @@ May it be that correlation coefficients are higher than Child ICC because we con
 
 This is still lower than the correlation observed for this same variable, `r rval_tab[rval_tab$metric=="can_voc_chi_ph","m"]`. We believe this is due to another difference between the two analyses, namely that here we are including all recordings, whereas the other analysis is focused on recordings less than 2 months away.
 
+## SM J: Information that is incorporated in Figure 2 (model fitting)
 
+> Out of the `r dim(df.icc.mixed)[1]` fitted models, `r table(df.icc.mixed$formula)["full"]` could be fit with the full model, yielding a measure of Corpus ICC.  For the `r table(df.icc.mixed$formula)["no_exp"]` for which the full model was singular, we fit the data with the No Corpus model, and none was singular then, allowing us to have Child ICC for all `r dim(df.icc.mixed)[1]` metrics. 
 
 
-## SM J: Code to reproduce text at the beginning of the "Overall reliability" section
+## SM K: Code to reproduce Table 4
 
 Please see code in the RMarkDown version of the document.
 
 
-> Out of the `r dim(df.icc.mixed)[1]` fitted models, `r table(df.icc.mixed$formula)["full"]` could be fit with the full model, yielding a measure of Corpus ICC. Of these, `r round(sum(df.icc.mixed$icc_corpus<.2,na.rm=T)/sum(!is.na(df.icc.mixed$icc_corpus))*100)`% had Corpus ICCs smaller than .2, consistent with the idea that LENA and ACLEW metrics are robust to corpus differences. For the `r table(df.icc.mixed$formula)["no_exp"]` for which the full model was singular, we fit the data with the No Corpus model, and none was singular then, allowing us to have Child ICC for all `r dim(df.icc.mixed)[1]` metrics. 
+```{r tab4, results="as.is"}
+key_metrics = c("wc_adu_ph", "lena_CVC_ph", "lena_CTC_ph",  "voc_fem_ph",  "voc_chi_ph")
+x <- merge(df.icc.mixed[df.icc.mixed$metric %in% key_metrics & df.icc.mixed$data_set=="lena",c("metric","icc_child_id")] ,
+           df.icc.mixed[df.icc.mixed$metric %in% key_metrics & df.icc.mixed$data_set=="aclew",c("metric","icc_child_id")],
+           by='metric', all=TRUE)
+colnames(x) <- c("metric", "LENA ICC", "ACLEW ICC")
+rownames(x)<-x$metric
+x["lena_CTC_ph","ACLEW ICC"]<-df.icc.mixed[df.icc.mixed$metric=="simple_CTC_ph","icc_child_id"]
+x["lena_CVC_ph","ACLEW ICC"]<-df.icc.mixed[df.icc.mixed$metric=="can_voc_chi_ph","icc_child_id"]
+x[,2:3]=round(x[,2:3],2)
+x=x[key_metrics,]
+
+kable(x,row.names = F,digits=2,caption="Table 4 (reproduced). Most commonly used metrics.")
+#x
+```
+
+
+
+
+## SM L: Code to reproduce text below Table 4 at the beginning of the "Overall reliability" section
+
+Please see code in the RMarkDown version of the document.
+
 
 ```{r best_metric}
 
@@ -455,9 +502,9 @@ best_metric$icc_child_id=round(best_metric$icc_child_id,2)
 ```
 
 
-> Figure 5 shows the distribution of Child ICC across all `r dim(df.icc.mixed)[1]` metrics, separately for each pipeline. The majority of measures had Child ICCs between .3 and .5. `r sum(df.icc.mixed$icc_child_id > .5)` measures had Child ICCs higher or equal to .5. Surprisingly, the top 6 metrics in terms of Child ICC corresponded to the "other child" category, known to have the worst accuracy according to previous analyses (Cristia et al., 2020). In an analysis fully reported in supplementary materials (SM K), we find some evidence that this may be due to the presence versus absence of siblings. The next metric with the highest Child ICC corresponded to an output measure, namely the total vocalization duration per hour extracted from ACLEW annotations (`r best_metric[best_metric$Type=="Output",c("metric","data_set")]`), with a Child ICC of `r best_metric[best_metric$Type=="Output","icc_child_id"]`. Among adult metrics, the average vocalization duration for female vocalizations for ACLEW (`r best_metric[best_metric$Type=="Female",c("metric","data_set")]`) and the ACLEW equivalent of CTC had the highest Child ICC (`r best_metric[best_metric$Type=="Female","icc_child_id"]` and `r best_metric[best_metric$Type=="Adults","icc_child_id"]`, respectively). 
+> The Child ICC of these metrics is not particularly high or low, given the overall distributions described below and illustrated in Figure 5, which shows the distribution of Child ICC across all `r dim(df.icc.mixed)[1]` metrics, separately for each pipeline. The majority of measures had Child ICCs between .3 and .5. Only `r sum(df.icc.mixed$icc_child_id > .5)` metrics had Child ICCs higher or equal to .5. Surprisingly, the top 6 metrics in terms of Child ICC corresponded to the "other child" category, known to have the worst accuracy according to previous analyses (Cristia et al., 2020). In an analysis fully reported in supplementary materials (SM M), we find some evidence that this may be due to the presence versus absence of siblings. The next metric with the highest Child ICC corresponded to an output measure, namely the total vocalization duration per hour extracted from ACLEW annotations (`r paste(best_metric[best_metric$Type=="Output",c("metric","data_set")])`), with a Child ICC of `r best_metric[best_metric$Type=="Output","icc_child_id"]`. Among adult metrics, the average vocalization duration for female vocalizations for ACLEW (`r paste(best_metric[best_metric$Type=="Female",c("metric","data_set")])`) and the ACLEW equivalent of CTC had the highest Child ICC (`r best_metric[best_metric$Type=="Female","icc_child_id"]` and `r best_metric[best_metric$Type=="Adults","icc_child_id"]`, respectively). 
 
-## SM K: Are high Child ICCs for "other child" measures due to number or presence of siblings? (Exploration)
+## SM M: Are high Child ICCs for "other child" measures due to number or presence of siblings? (Exploration)
 
 ```{r explo-och-sibn}
 
@@ -501,7 +548,7 @@ Perhaps it is not so much the sheer number of siblings that explains variance, b
 As in the sibling number analysis, the full model was singular, so we fitted a No Corpus model to be able to extract a Child ICC. We again verified that sibling presence predicted the outcome, total vocalization duration by other children -- and found that it did: ß = `r round(summary(model_sib_presence)$coefficients["sib_presencepresent","Estimate"],2)`, t = `r round(summary(model_sib_presence)$coefficients["sib_presencepresent","t value"],2)`, p < .001. This effect is, as expected, sizable: It means that there is nearly one whole standard deviation increase in this variable when there are any siblings. In addition to being a better predictor, in this model, the amount of variance allocated to individual children as measured by Child ICC was considerably higher in our original analysis (`r round(df.icc.mixed[df.icc.mixed$metric=="voc_dur_och_ph" & df.icc.mixed$data_set=="aclew","icc_child_id"],2)`) than in this re-analysis including sibling presence (`r round(icc.result.split["icc_child_id"],2)`).
 
 
-## SM L: Are "bad" output measures those coming from VCM? (Exploration)
+## SM N: Are "bad" output measures those coming from VCM? (Exploration)
 
 Among ACLEW measures, a fair number of them come from VCM, a module that classifies child vocalizations in terms of vocal maturity types into cry, canonical, and non-canonical categories. In unpublished analyses, we have found that VCM labels are inaccurate when compared to human labels of the same vocalizations, relatively to other metrics. In this analysis, we checked whether VCM-derived measures had lower Child ICC than other ACLEW measures. As shown in the next Figure, this was not the case: Some output measures from the ACLEW pipeline have lower Child ICC than VCM ones.
 
@@ -524,7 +571,7 @@ panel.background = element_blank(), legend.key=element_blank(), axis.line = elem
 
 ```
 
-## SM M: Code to reproduce Figure 5
+## SM O: Code to reproduce Figure 5
 
 Please see code in the RMarkDown version of the document.
 
@@ -553,7 +600,7 @@ ggsave("../output/fig5.png", plot = fig5, width = 4, height = 3, units = "in")
 ```
 
 
-## SM N: Code to reproduce text below Figure 5
+## SM P: Code to reproduce text below Figure 5
 
 Please see code in the RMarkDown version of the document.
 
@@ -578,40 +625,25 @@ rownames(msds_p)<-msds_p$Group.1
 ```
 
 
-> Next, we explored how similar Child ICCs were across different talker types and pipelines. We fit a linear model with the formula $lm(icc\_child\_id ~ type * pipeline)$, where type indicates whether the measure pertained to the key child, (female/male) adults, other children; and pipeline LENA or ACLEW. The model was overall significant (F(`r round(reg_sum$fstatistic["dendf"],2)`) = `r round(reg_sum$fstatistic["value"],2)`, p < .001). We found an adjusted R-squared of `r round(reg_sum$adj.r.squared*100)`%, suggesting much of the variance across Child ICCs was explained by these factors. A Type 3 ANOVA on this model revealed type was a significant predictor (F(`r reg_anova["Type","Df"]`) = `r round(reg_anova["Type","F value"],1)`, p<.001), as was pipeline (F(`r reg_anova["data_set","Df"]`) = `r round(reg_anova["data_set","F value"],1)`, p = `r round(reg_anova["data_set","Pr(>F)"],3)`); the interaction between type and pipeline was not significant. The main effect of type emerged because output metrics tended to have higher Child ICC (`r msds["Output","x"]`)  than those associated to adults in general (`r msds["Adults","x"]`), females (`r msds["Female","x"]`), and males (`r msds["Male","x"]`); whereas those associated with other children had even higher Child ICCs (`r msds["Other children","x"]`). The main effect of pipeline arose because of slightly higher Child ICCs for the ACLEW metrics (`r msds_p["aclew","x"]`) than for LENA metrics (`r msds_p["lena","x"]`). 
-
-
-## SM O: Code to reproduce Table 4
-
-Please see code in the RMarkDown version of the document.
+> Next, we explored how similar Child ICCs were across different talker types and pipelines. We fit a linear model with the formula $lm(icc\_child\_id ~ type * pipeline)$, where type indicates whether the measure pertained to the key child, (female/male) adults, other children; and pipeline LENA or ACLEW. The model was overall significant (F(`r round(reg_sum$fstatistic["dendf"],2)`) = `r round(reg_sum$fstatistic["value"],2)`, p < .001). We found an adjusted R-squared of `r round(reg_sum$adj.r.squared*100)`%, suggesting much of the variance across Child ICCs was explained by these factors. A Type 3 ANOVA on this model revealed type was a significant predictor (F(`r reg_anova["Type","Df"]`) = `r round(reg_anova["Type","F value"],1)`, p<.001), and pipeline was marginal (F(`r reg_anova["data_set","Df"]`) = `r round(reg_anova["data_set","F value"],1)`, p = `r round(reg_anova["data_set","Pr(>F)"],3)`); the interaction between type and pipeline was not significant. The main effect of type emerged because output metrics tended to have higher Child ICC (`r msds["Output","x"]`)  than those associated to adults in general (`r msds["Adults","x"]`), females (`r msds["Female","x"]`), and males (`r msds["Male","x"]`); whereas those associated with other children had even higher Child ICCs (`r msds["Other children","x"]`). The trend for a main effect of pipeline arose because of slightly higher Child ICCs for the ACLEW metrics (`r msds_p["aclew","x"]`) than for LENA metrics (`r msds_p["lena","x"]`). 
 
+See table below for results of the Type 3 ANOVA.
 
-```{r tab4, results="as.is"}
-key_metrics = c("wc_adu_ph", "lena_CVC_ph", "lena_CTC_ph",  "voc_fem_ph",  "voc_chi_ph")
-x <- merge(df.icc.mixed[df.icc.mixed$metric %in% key_metrics & df.icc.mixed$data_set=="lena",c("metric","icc_child_id")] ,
-           df.icc.mixed[df.icc.mixed$metric %in% key_metrics & df.icc.mixed$data_set=="aclew",c("metric","icc_child_id")],
-           by='metric', all=TRUE)
-colnames(x) <- c("metric", "LENA ICC", "ACLEW ICC")
-rownames(x)<-x$metric
-x["lena_CTC_ph","ACLEW ICC"]<-df.icc.mixed[df.icc.mixed$metric=="simple_CTC_ph","icc_child_id"]
-x["lena_CVC_ph","ACLEW ICC"]<-df.icc.mixed[df.icc.mixed$metric=="can_voc_chi_ph","icc_child_id"]
-x[,2:3]=round(x[,2:3],2)
-x=x[key_metrics,]
+```{r print out anova results}
 
-kable(x,row.names = F,digits=2,caption="Table 4 (reproduced). Most commonly used metrics.")
-#x
+kable(round(reg_anova,2),caption="Type 3 ANOVA on model attempting to explain variation in Child ICC as a function of talker types and pipelines.")
 ```
 
 
 
-## SM P: Code to reproduce text at the beginning of the "Reliability across age groups" section
+## SM Q: Code to reproduce text at the beginning of the "Reliability across age groups" section
 
 Please see code in the RMarkDown version of the document.
 
 
 > Out of `r dim(df.icc.age)[1]` fitted models (`r dim(df.icc.mixed)[1]` metrics times `r length(levels(factor(df.icc.age$age_bin)))` age bins), `r sum(df.icc.age$formula=="no_chi_effect")` were singular when including a random intercept per child, and therefore they could not be included in these analyses at all. In addition, `r sum(df.icc.age$formula=="no_exp")` were singular when including a random intercept per corpus. The remaining `r sum(df.icc.age$formula=="full")` could be analyzed with the full model.
 
-## SM Q: Code to reproduce Figure 6
+## SM R: Code to reproduce Figure 6
 
 Please see code in the RMarkDown version of the document.
 
@@ -637,6 +669,7 @@ f_labels$age_bin<-factor(f_labels$age_bin,levels=age_levels)
 
 fig6 <- ggplot(df.icc.age, aes(y = icc_child_id, x = toupper(data_set))) +
   geom_violin(alpha = 0.5) +
+<<<<<<< HEAD
   stat_summary(fun = mean, geom = "point", aes(x = as.numeric(factor(toupper(data_set))) - 0.5), shape = 23, size = 3, fill = "white", color = "black", position = position_dodge(width = 0.75)) +
   geom_quasirandom(aes(colour = Type, shape = Type)) +  
   scale_color_manual(values = type_colors) +  # Using color-blind-friendly palette for metric type
@@ -650,6 +683,23 @@ fig6 <- ggplot(df.icc.age, aes(y = icc_child_id, x = toupper(data_set))) +
         legend.key = element_blank(),
         axis.line = element_line(colour = "black"))
 
+=======
+#    stat_summary(fun = mean, geom = "point", aes(x = as.numeric(factor(toupper(data_set))) - 0.5), shape = 23, size = 3, fill = "white", color = "black", position = position_dodge(width = 0.75)) +
+  geom_quasirandom(aes(colour = Type,shape = Type)) +  
+  theme(legend.position="none") +labs( y = "r",x="Pipeline") + facet_wrap(~age_bin, ncol = 3) +
+  geom_text(x=1.5,y=max(df.icc.age$icc_child_id,na.rm=T),aes(label=facet_labels_chi),data=f_labels,size=3) +
+  geom_text(x=1.5,y=max(df.icc.age$icc_child_id,na.rm=T)*.95,aes(label=facet_labels_cor),data=f_labels,size=3) + 
+    stat_summary(fun = mean, geom = "point", aes(group = Type,x = as.numeric(factor(toupper(data_set))) + 0.5), shape = 1, size = 3, fill = "white", color = "black") +
+  stat_summary(
+    aes(group = Type, x = as.numeric(factor(toupper(data_set))) + 0.5, y = icc_child_id,color = Type, shape = Type), 
+    fun = mean, 
+    geom = "point", 
+    show.legend = FALSE,
+    inherit.aes = FALSE
+  ) +
+  theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),
+panel.background = element_blank(), legend.key=element_blank(), axis.line = element_line(colour = "black")) 
+>>>>>>> origin/master
 
 fig6
 
@@ -658,7 +708,7 @@ ggsave("../output/fig6.png", plot = fig6, width = 6, height = 10, units = "in")
 
 ```
 
-## SM R: Code to reproduce text below Figure 6
+## SM S: Code to reproduce text below Figure 6
 
 Please see code in the RMarkDown version of the document.
 
@@ -676,8 +726,7 @@ reg_anova_age_icc=Anova(age_icc)
 
 ```
 
-> To interrogate these results statistically, and assess whether Child ICCs tended to be higher or lower in certain age bins, we fit a linear model with the formula $lm(Child\_ICC ~ type * pipeline * age\_bin)$. The model was overall significant (F(`r round(reg_sum_age_icc$fstatistic["dendf"],2)`) = `r round(reg_sum_age_icc$fstatistic["value"],2)`, p < .001). We found an adjusted R-squared of `r round(reg_sum_age_icc$adj.r.squared*100)`%, suggesting this model explained more than a third of the variance in Child ICC.  A Type 3 ANOVA on this model revealed that the interactions between type and pipeline, pipeline and age, and the three-way interaction (type, pipeline, age) were not significant. However, both the type by age bin interaction (F(`r reg_anova_age_icc["Type:age_bin","Df"]`) = `r round(reg_anova_age_icc["Type:age_bin","F value"],1)`, p < .001) and the three main effects were significant (
-type: F(`r reg_anova_age_icc["Type","Df"]`) = `r round(reg_anova_age_icc["Type","F value"],1)`, p < .001; 
+> To interrogate these results statistically, and assess whether Child ICCs tended to be higher or lower in certain age bins, we fit a linear model with the formula $lm(Child\_ICC ~ type * pipeline * age\_bin)$. The model was overall significant (F(`r round(reg_sum_age_icc$fstatistic["dendf"],2)`) = `r round(reg_sum_age_icc$fstatistic["value"],2)`, p < .001). We found an adjusted R-squared of `r round(reg_sum_age_icc$adj.r.squared*100)`%, suggesting this model explained more than a third of the variance in Child ICC.  A Type 3 ANOVA on this model revealed that the interactions between type and pipeline, pipeline and age, and the three-way interaction (type, pipeline, age) were not significant. However, both the type*age bin interaction (F(`r reg_anova_age_icc["Type:age_bin","Df"]`) = `r round(reg_anova_age_icc["Type:age_bin","F value"],1)`, p < .001) and the three main effects were significant (type: F(`r reg_anova_age_icc["Type","Df"]`) = `r round(reg_anova_age_icc["Type","F value"],1)`, p < .001; 
 age: F(`r reg_anova_age_icc["age_bin","Df"]`) = `r round(reg_anova_age_icc["age_bin","F value"],1)`, p < .001; 
 pipeline: F(`r reg_anova_age_icc["data_set","Df"]`) = `r round(reg_anova_age_icc["age_bin","F value"],1)`, p = .01).
 
@@ -691,7 +740,7 @@ kable(round(reg_anova_age_icc,2),caption="Type 3 ANOVA on model attempting to ex
 
 
 
-## SM S: Code to reproduce Figure 7
+## SM T: Code to reproduce Figure 7
 
 Please see code in the RMarkDown version of the document.
 
@@ -739,7 +788,7 @@ ggsave("../output/fig7.png", plot = fig7, width = 4, height = 4, units = "in")
 
 
 
-## SM T: Code to reproduce text in the "Reliability within corpus" section
+## SM U: Code to reproduce text in the "Reliability within corpus" section
 
 Please see code in the RMarkDown version of the document.
 
@@ -747,7 +796,7 @@ Please see code in the RMarkDown version of the document.
 > Out of `r dim(df.icc.corpus)[1]` fitted models (`r dim(df.icc.mixed)[1]` metrics times `r length(levels(factor(df.icc.corpus$corpus)))` corpora), `r sum(df.icc.corpus$formula=="no_chi_effect")` were singular when including a random intercept per child, and therefore they could not be included in these analyses at all. (Including a random intercept per corpus is not relevant here, since only data from one corpus is included in each model fit.)
 
 
-## SM U: Code to reproduce Figure 8
+## SM V: Code to reproduce Figure 8
 
 Please see code in the RMarkDown version of the document.
 
@@ -779,7 +828,7 @@ ggsave("../output/fig8.png", plot = fig8, width = 8, height = 4, units = "in")
 
 ```
 
-## SM V: Code to reproduce text below Figure 8
+## SM W: Code to reproduce text below Figure 8
 
 Please see code in the RMarkDown version of the document.
 
@@ -807,7 +856,7 @@ kable(round(reg_anova_cor_icc,2),caption="Type 3 ANOVA on model attempting to ex
 
 ```
 
-## SM W: Code to reproduce Figure 9
+## SM X: Code to reproduce Figure 9
 
 Please see code in the RMarkDown version of the document.
 
@@ -853,7 +902,7 @@ fig9
 ggsave("../output/fig9.png", plot = fig9, width = 8, height = 4, units = "in")
 ```
 
-## SM X: Code to reproduce text in the Discussion section
+## SM Y: Code to reproduce text in the Discussion section
 
 Please see code in the RMarkDown version of the document.
 
@@ -879,13 +928,13 @@ bias_tab$recXcor<-bias_tab$recXcor/sum(bias_tab$recXcor)
 
 ```
 
-> Our data draws mainly from urban (`r round(sum(bias_tab$recXcor[urban])*100)`% of recordings, `r round(sum(bias_tab$chiXcor[urban])*100)`% of the children, `r round(sum(urban)/length(urban)*100)`% of the corpora), English-speaking settings (`r round(sum(bias_tab$recXcor[english])*100)`% of recordings, `r round(sum(bias_tab$chiXcor[english])*100)`% of the children, `r round(sum(english)/length(english)*100)`% of the corpora), and almost exclusively from North America (`r round(sum(bias_tab$recXcor[northam])*100)`% of recordings, `r round(sum(bias_tab$chiXcor[northam])*100)`% of the children, `r round(sum(northam)/length(northam)*100)`% of the corpora). 
+> Our data draws mainly from urban (`r round(sum(bias_tab$recXcor[urban])*100)`% of recordings, `r round(sum(bias_tab$chiXcor[urban])*100)`% of the children, `r round(sum(urban)/length(urban)*100)`% of the corpora), English-speaking settings (`r round(sum(bias_tab$recXcor[english])*100)`% of recordings, `r round(sum(bias_tab$chiXcor[english])*100)`% of the children, `r round(sum(english)/length(english)*100)`% of the corpora), largely from North America (`r round(sum(bias_tab$recXcor[northam])*100)`% of recordings, `r round(sum(bias_tab$chiXcor[northam])*100)`% of the children, `r round(sum(northam)/length(northam)*100)`% of the corpora). 
 
-## SM Y: Variability as a function of hardware
+## SM Z: Variability as a function of hardware
 
 Another potential negative contribution to reliability that is currently not discussed is variability in the experimental setup. In a corpus collected in the Solomon Islands, children were wearing two recorders simultaneously. These were USB devices, sourced from two different providers. In this dataset, the duration of the recordings could be very different within the same pair (a ~10% difference was not atypical), which means that what is actually recorded is somewhat random in itself. Even comparing identical audio ranges covered by both recordings of each pair, the corresponding ACLEW metrics differed slightly; they were strongly correlated (R^2 was close to 0.95) but not perfectly correlated. This suggests that randomness in the recorders properties and their placement may also contribute to a decrease reliability. This reliability is importantly not at all due to changing underlying conditions, as both recorders picked up on the exact same day, so it is not due to variability in underlying behaviors. It is also not due to algorithmic variation because ACLEW algorithms are deterministic. Thus, this variability is only due to hardware differences and potentially also differences in e.g. USB placement.
 
-## SM Z: References
+## References
 
 
 Alcock, K., Meints, K., & Rowland, C. (2020). The UK Communicative Development Inventories. London, UK: J&R Press. 

File diff suppressed because it is too large
+ 397 - 275
CODE/SM.html


+ 0 - 759
CODE/SM.log

@@ -1,759 +0,0 @@
-This is pdfTeX, Version 3.141592653-2.6-1.40.25 (TeX Live 2023) (preloaded format=pdflatex 2023.8.30)  19 APR 2024 13:39
-entering extended mode
- restricted \write18 enabled.
- %&-line parsing enabled.
-**SM.tex
-(./SM.tex
-LaTeX2e <2023-06-01> patch level 1
-L3 programming layer <2023-08-29>
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/base/article.cls
-Document Class: article 2023/05/17 v1.4n Standard LaTeX document class
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/base/size10.clo
-File: size10.clo 2023/05/17 v1.4n Standard LaTeX file (size option)
-)
-\c@part=\count185
-\c@section=\count186
-\c@subsection=\count187
-\c@subsubsection=\count188
-\c@paragraph=\count189
-\c@subparagraph=\count190
-\c@figure=\count191
-\c@table=\count192
-\abovecaptionskip=\skip48
-\belowcaptionskip=\skip49
-\bibindent=\dimen140
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsmath/amsmath.sty
-Package: amsmath 2023/05/13 v2.17o AMS math features
-\@mathmargin=\skip50
-For additional information on amsmath, use the `?' option.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsmath/amstext.sty
-Package: amstext 2021/08/26 v2.01 AMS text
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsmath/amsgen.sty
-File: amsgen.sty 1999/11/30 v2.0 generic functions
-\@emptytoks=\toks17
-\ex@=\dimen141
-)) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsmath/amsbsy.sty
-Package: amsbsy 1999/11/29 v1.2d Bold Symbols
-\pmbraise@=\dimen142
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsmath/amsopn.sty
-Package: amsopn 2022/04/08 v2.04 operator names
-)
-\inf@bad=\count193
-LaTeX Info: Redefining \frac on input line 234.
-\uproot@=\count194
-\leftroot@=\count195
-LaTeX Info: Redefining \overline on input line 399.
-LaTeX Info: Redefining \colon on input line 410.
-\classnum@=\count196
-\DOTSCASE@=\count197
-LaTeX Info: Redefining \ldots on input line 496.
-LaTeX Info: Redefining \dots on input line 499.
-LaTeX Info: Redefining \cdots on input line 620.
-\Mathstrutbox@=\box51
-\strutbox@=\box52
-LaTeX Info: Redefining \big on input line 722.
-LaTeX Info: Redefining \Big on input line 723.
-LaTeX Info: Redefining \bigg on input line 724.
-LaTeX Info: Redefining \Bigg on input line 725.
-\big@size=\dimen143
-LaTeX Font Info:    Redeclaring font encoding OML on input line 743.
-LaTeX Font Info:    Redeclaring font encoding OMS on input line 744.
-\macc@depth=\count198
-LaTeX Info: Redefining \bmod on input line 905.
-LaTeX Info: Redefining \pmod on input line 910.
-LaTeX Info: Redefining \smash on input line 940.
-LaTeX Info: Redefining \relbar on input line 970.
-LaTeX Info: Redefining \Relbar on input line 971.
-\c@MaxMatrixCols=\count199
-\dotsspace@=\muskip16
-\c@parentequation=\count266
-\dspbrk@lvl=\count267
-\tag@help=\toks18
-\row@=\count268
-\column@=\count269
-\maxfields@=\count270
-\andhelp@=\toks19
-\eqnshift@=\dimen144
-\alignsep@=\dimen145
-\tagshift@=\dimen146
-\tagwidth@=\dimen147
-\totwidth@=\dimen148
-\lineht@=\dimen149
-\@envbody=\toks20
-\multlinegap=\skip51
-\multlinetaggap=\skip52
-\mathdisplay@stack=\toks21
-LaTeX Info: Redefining \[ on input line 2953.
-LaTeX Info: Redefining \] on input line 2954.
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsfonts/amssymb.sty
-Package: amssymb 2013/01/14 v3.01 AMS font symbols
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsfonts/amsfonts.sty
-Package: amsfonts 2013/01/14 v3.01 Basic AMSFonts support
-\symAMSa=\mathgroup4
-\symAMSb=\mathgroup5
-LaTeX Font Info:    Redeclaring math symbol \hbar on input line 98.
-LaTeX Font Info:    Overwriting math alphabet `\mathfrak' in version `bold'
-(Font)                  U/euf/m/n --> U/euf/b/n on input line 106.
-)) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/lm/lmodern.sty
-Package: lmodern 2015/05/01 v1.6.1 Latin Modern Fonts
-LaTeX Font Info:    Overwriting symbol font `operators' in version `normal'
-(Font)                  OT1/cmr/m/n --> OT1/lmr/m/n on input line 22.
-LaTeX Font Info:    Overwriting symbol font `letters' in version `normal'
-(Font)                  OML/cmm/m/it --> OML/lmm/m/it on input line 23.
-LaTeX Font Info:    Overwriting symbol font `symbols' in version `normal'
-(Font)                  OMS/cmsy/m/n --> OMS/lmsy/m/n on input line 24.
-LaTeX Font Info:    Overwriting symbol font `largesymbols' in version `normal'
-(Font)                  OMX/cmex/m/n --> OMX/lmex/m/n on input line 25.
-LaTeX Font Info:    Overwriting symbol font `operators' in version `bold'
-(Font)                  OT1/cmr/bx/n --> OT1/lmr/bx/n on input line 26.
-LaTeX Font Info:    Overwriting symbol font `letters' in version `bold'
-(Font)                  OML/cmm/b/it --> OML/lmm/b/it on input line 27.
-LaTeX Font Info:    Overwriting symbol font `symbols' in version `bold'
-(Font)                  OMS/cmsy/b/n --> OMS/lmsy/b/n on input line 28.
-LaTeX Font Info:    Overwriting symbol font `largesymbols' in version `bold'
-(Font)                  OMX/cmex/m/n --> OMX/lmex/m/n on input line 29.
-LaTeX Font Info:    Overwriting math alphabet `\mathbf' in version `normal'
-(Font)                  OT1/cmr/bx/n --> OT1/lmr/bx/n on input line 31.
-LaTeX Font Info:    Overwriting math alphabet `\mathsf' in version `normal'
-(Font)                  OT1/cmss/m/n --> OT1/lmss/m/n on input line 32.
-LaTeX Font Info:    Overwriting math alphabet `\mathit' in version `normal'
-(Font)                  OT1/cmr/m/it --> OT1/lmr/m/it on input line 33.
-LaTeX Font Info:    Overwriting math alphabet `\mathtt' in version `normal'
-(Font)                  OT1/cmtt/m/n --> OT1/lmtt/m/n on input line 34.
-LaTeX Font Info:    Overwriting math alphabet `\mathbf' in version `bold'
-(Font)                  OT1/cmr/bx/n --> OT1/lmr/bx/n on input line 35.
-LaTeX Font Info:    Overwriting math alphabet `\mathsf' in version `bold'
-(Font)                  OT1/cmss/bx/n --> OT1/lmss/bx/n on input line 36.
-LaTeX Font Info:    Overwriting math alphabet `\mathit' in version `bold'
-(Font)                  OT1/cmr/bx/it --> OT1/lmr/bx/it on input line 37.
-LaTeX Font Info:    Overwriting math alphabet `\mathtt' in version `bold'
-(Font)                  OT1/cmtt/m/n --> OT1/lmtt/m/n on input line 38.
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/iftex/iftex.sty
-Package: iftex 2022/02/03 v1.0f TeX engine tests
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/base/fontenc.sty
-Package: fontenc 2021/04/29 v2.0v Standard LaTeX package
-LaTeX Font Info:    Trying to load font information for T1+lmr on input line 112.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/lm/t1lmr.fd
-File: t1lmr.fd 2015/05/01 v1.6.1 Font defs for Latin Modern
-)) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/base/inputenc.sty
-Package: inputenc 2021/02/14 v1.3d Input encoding file
-\inpenc@prehook=\toks22
-\inpenc@posthook=\toks23
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/base/textcomp.sty
-Package: textcomp 2020/02/02 v2.0n Standard LaTeX package
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/microtype/microtype.sty
-Package: microtype 2023/03/13 v3.1a Micro-typographical refinements (RS)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics/keyval.sty
-Package: keyval 2022/05/29 v1.15 key=value parser (DPC)
-\KV@toks@=\toks24
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/etoolbox/etoolbox.sty
-Package: etoolbox 2020/10/05 v2.5k e-TeX tools for LaTeX (JAW)
-\etb@tempcnta=\count271
-)
-\MT@toks=\toks25
-\MT@tempbox=\box53
-\MT@count=\count272
-LaTeX Info: Redefining \noprotrusionifhmode on input line 1059.
-LaTeX Info: Redefining \leftprotrusion on input line 1060.
-\MT@prot@toks=\toks26
-LaTeX Info: Redefining \rightprotrusion on input line 1078.
-LaTeX Info: Redefining \textls on input line 1368.
-\MT@outer@kern=\dimen150
-LaTeX Info: Redefining \textmicrotypecontext on input line 1988.
-\MT@listname@count=\count273
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/microtype/microtype-pdftex.def
-File: microtype-pdftex.def 2023/03/13 v3.1a Definitions specific to pdftex (RS)
-LaTeX Info: Redefining \lsstyle on input line 902.
-LaTeX Info: Redefining \lslig on input line 902.
-\MT@outer@space=\skip53
-)
-Package microtype Info: Loading configuration file microtype.cfg.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/microtype/microtype.cfg
-File: microtype.cfg 2023/03/13 v3.1a microtype main configuration file (RS)
-)) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/xcolor/xcolor.sty
-Package: xcolor 2022/06/12 v2.14 LaTeX color extensions (UK)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics-cfg/color.cfg
-File: color.cfg 2016/01/02 v1.6 sample color configuration
-)
-Package xcolor Info: Driver file: pdftex.def on input line 227.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics-def/pdftex.def
-File: pdftex.def 2022/09/22 v1.2b Graphics/color driver for pdftex
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics/mathcolor.ltx)
-Package xcolor Info: Model `cmy' substituted by `cmy0' on input line 1353.
-Package xcolor Info: Model `hsb' substituted by `rgb' on input line 1357.
-Package xcolor Info: Model `RGB' extended on input line 1369.
-Package xcolor Info: Model `HTML' substituted by `rgb' on input line 1371.
-Package xcolor Info: Model `Hsb' substituted by `hsb' on input line 1372.
-Package xcolor Info: Model `tHsb' substituted by `hsb' on input line 1373.
-Package xcolor Info: Model `HSB' substituted by `hsb' on input line 1374.
-Package xcolor Info: Model `Gray' substituted by `gray' on input line 1375.
-Package xcolor Info: Model `wave' substituted by `hsb' on input line 1376.
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/hyperref/hyperref.sty
-Package: hyperref 2023-07-08 v7.01b Hypertext links for LaTeX
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/ltxcmds/ltxcmds.sty
-Package: ltxcmds 2020-05-10 v1.25 LaTeX kernel commands for general use (HO)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/pdftexcmds/pdftexcmds.sty
-Package: pdftexcmds 2020-06-27 v0.33 Utility functions of pdfTeX for LuaTeX (HO)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/infwarerr/infwarerr.sty
-Package: infwarerr 2019/12/03 v1.5 Providing info/warning/error messages (HO)
-)
-Package pdftexcmds Info: \pdf@primitive is available.
-Package pdftexcmds Info: \pdf@ifprimitive is available.
-Package pdftexcmds Info: \pdfdraftmode found.
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/kvsetkeys/kvsetkeys.sty
-Package: kvsetkeys 2022-10-05 v1.19 Key value parser (HO)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/kvdefinekeys/kvdefinekeys.sty
-Package: kvdefinekeys 2019-12-19 v1.6 Define keys (HO)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/pdfescape/pdfescape.sty
-Package: pdfescape 2019/12/09 v1.15 Implements pdfTeX's escape features (HO)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/hycolor/hycolor.sty
-Package: hycolor 2020-01-27 v1.10 Color options for hyperref/bookmark (HO)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/letltxmacro/letltxmacro.sty
-Package: letltxmacro 2019/12/03 v1.6 Let assignment for LaTeX macros (HO)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/auxhook/auxhook.sty
-Package: auxhook 2019-12-17 v1.6 Hooks for auxiliary files (HO)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/hyperref/nameref.sty
-Package: nameref 2023-08-07 v2.53 Cross-referencing by name of section
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/refcount/refcount.sty
-Package: refcount 2019/12/15 v3.6 Data extraction from label references (HO)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/gettitlestring/gettitlestring.sty
-Package: gettitlestring 2019/12/15 v1.6 Cleanup title references (HO)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/kvoptions/kvoptions.sty
-Package: kvoptions 2022-06-15 v3.15 Key value format for package options (HO)
-))
-\c@section@level=\count274
-)
-\@linkdim=\dimen151
-\Hy@linkcounter=\count275
-\Hy@pagecounter=\count276
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/hyperref/pd1enc.def
-File: pd1enc.def 2023-07-08 v7.01b Hyperref: PDFDocEncoding definition (HO)
-Now handling font encoding PD1 ...
-... no UTF-8 mapping file for font encoding PD1
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/intcalc/intcalc.sty
-Package: intcalc 2019/12/15 v1.3 Expandable calculations with integers (HO)
-)
-\Hy@SavedSpaceFactor=\count277
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/hyperref/puenc.def
-File: puenc.def 2023-07-08 v7.01b Hyperref: PDF Unicode definition (HO)
-Now handling font encoding PU ...
-... no UTF-8 mapping file for font encoding PU
-)
-Package hyperref Info: Option `unicode' set `true' on input line 4050.
-Package hyperref Info: Hyper figures OFF on input line 4167.
-Package hyperref Info: Link nesting OFF on input line 4172.
-Package hyperref Info: Hyper index ON on input line 4175.
-Package hyperref Info: Plain pages OFF on input line 4182.
-Package hyperref Info: Backreferencing OFF on input line 4187.
-Package hyperref Info: Implicit mode ON; LaTeX internals redefined.
-Package hyperref Info: Bookmarks ON on input line 4434.
-\c@Hy@tempcnt=\count278
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/url/url.sty
-\Urlmuskip=\muskip17
-Package: url 2013/09/16  ver 3.4  Verb mode for urls, etc.
-)
-LaTeX Info: Redefining \url on input line 4772.
-\XeTeXLinkMargin=\dimen152
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/bitset/bitset.sty
-Package: bitset 2019/12/09 v1.3 Handle bit-vector datatype (HO)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/bigintcalc/bigintcalc.sty
-Package: bigintcalc 2019/12/15 v1.5 Expandable calculations on big integers (HO)
-))
-\Fld@menulength=\count279
-\Field@Width=\dimen153
-\Fld@charsize=\dimen154
-Package hyperref Info: Hyper figures OFF on input line 6051.
-Package hyperref Info: Link nesting OFF on input line 6056.
-Package hyperref Info: Hyper index ON on input line 6059.
-Package hyperref Info: backreferencing OFF on input line 6066.
-Package hyperref Info: Link coloring OFF on input line 6071.
-Package hyperref Info: Link coloring with OCG OFF on input line 6076.
-Package hyperref Info: PDF/A mode OFF on input line 6081.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/base/atbegshi-ltx.sty
-Package: atbegshi-ltx 2021/01/10 v1.0c Emulation of the original atbegshi
-package with kernel methods
-)
-\Hy@abspage=\count280
-\c@Item=\count281
-\c@Hfootnote=\count282
-)
-Package hyperref Info: Driver (autodetected): hpdftex.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/hyperref/hpdftex.def
-File: hpdftex.def 2023-07-08 v7.01b Hyperref driver for pdfTeX
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/base/atveryend-ltx.sty
-Package: atveryend-ltx 2020/08/19 v1.0a Emulation of the original atveryend package
-with kernel methods
-)
-\Fld@listcount=\count283
-\c@bookmark@seq@number=\count284
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/rerunfilecheck/rerunfilecheck.sty
-Package: rerunfilecheck 2022-07-10 v1.10 Rerun checks for auxiliary files (HO)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/uniquecounter/uniquecounter.sty
-Package: uniquecounter 2019/12/15 v1.4 Provide unlimited unique counter (HO)
-)
-Package uniquecounter Info: New unique counter `rerunfilecheck' on input line 285.
-)
-\Hy@SectionHShift=\skip54
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/geometry/geometry.sty
-Package: geometry 2020/01/02 v5.9 Page Geometry
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/iftex/ifvtex.sty
-Package: ifvtex 2019/10/25 v1.7 ifvtex legacy package. Use iftex instead.
-)
-\Gm@cnth=\count285
-\Gm@cntv=\count286
-\c@Gm@tempcnt=\count287
-\Gm@bindingoffset=\dimen155
-\Gm@wd@mp=\dimen156
-\Gm@odd@mp=\dimen157
-\Gm@even@mp=\dimen158
-\Gm@layoutwidth=\dimen159
-\Gm@layoutheight=\dimen160
-\Gm@layouthoffset=\dimen161
-\Gm@layoutvoffset=\dimen162
-\Gm@dimlist=\toks27
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics/graphicx.sty
-Package: graphicx 2021/09/16 v1.2d Enhanced LaTeX Graphics (DPC,SPQR)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics/graphics.sty
-Package: graphics 2022/03/10 v1.4e Standard LaTeX Graphics (DPC,SPQR)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics/trig.sty
-Package: trig 2021/08/11 v1.11 sin cos tan (DPC)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics-cfg/graphics.cfg
-File: graphics.cfg 2016/06/04 v1.11 sample graphics configuration
-)
-Package graphics Info: Driver file: pdftex.def on input line 107.
-)
-\Gin@req@height=\dimen163
-\Gin@req@width=\dimen164
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/booktabs/booktabs.sty
-Package: booktabs 2020/01/12 v1.61803398 Publication quality tables
-\heavyrulewidth=\dimen165
-\lightrulewidth=\dimen166
-\cmidrulewidth=\dimen167
-\belowrulesep=\dimen168
-\belowbottomsep=\dimen169
-\aboverulesep=\dimen170
-\abovetopsep=\dimen171
-\cmidrulesep=\dimen172
-\cmidrulekern=\dimen173
-\defaultaddspace=\dimen174
-\@cmidla=\count288
-\@cmidlb=\count289
-\@aboverulesep=\dimen175
-\@belowrulesep=\dimen176
-\@thisruleclass=\count290
-\@lastruleclass=\count291
-\@thisrulewidth=\dimen177
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/tools/longtable.sty
-Package: longtable 2021-09-01 v4.17 Multi-page Table package (DPC)
-\LTleft=\skip55
-\LTright=\skip56
-\LTpre=\skip57
-\LTpost=\skip58
-\LTchunksize=\count292
-\LTcapwidth=\dimen178
-\LT@head=\box54
-\LT@firsthead=\box55
-\LT@foot=\box56
-\LT@lastfoot=\box57
-\LT@gbox=\box58
-\LT@cols=\count293
-\LT@rows=\count294
-\c@LT@tables=\count295
-\c@LT@chunks=\count296
-\LT@p@ftn=\toks28
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/tools/array.sty
-Package: array 2022/09/04 v2.5g Tabular extension package (FMi)
-\col@sep=\dimen179
-\ar@mcellbox=\box59
-\extrarowheight=\dimen180
-\NC@list=\toks29
-\extratabsurround=\skip59
-\backup@length=\skip60
-\ar@cellbox=\box60
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/multirow/multirow.sty
-Package: multirow 2021/03/15 v2.8 Span multiple rows of a table
-\multirow@colwidth=\skip61
-\multirow@cntb=\count297
-\multirow@dima=\skip62
-\bigstrutjot=\dimen181
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/wrapfig/wrapfig.sty
-\wrapoverhang=\dimen182
-\WF@size=\dimen183
-\c@WF@wrappedlines=\count298
-\WF@box=\box61
-\WF@everypar=\toks30
-Package: wrapfig 2003/01/31  v 3.6
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/float/float.sty
-Package: float 2001/11/08 v1.3d Float enhancements (AL)
-\c@float@type=\count299
-\float@exts=\toks31
-\float@box=\box62
-\@float@everytoks=\toks32
-\@floatcapt=\box63
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/colortbl/colortbl.sty
-Package: colortbl 2022/06/20 v1.0f Color table columns (DPC)
-\everycr=\toks33
-\minrowclearance=\skip63
-\rownum=\count300
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/pdflscape/pdflscape.sty
-Package: pdflscape 2022-10-27 v0.13 Display of landscape pages in PDF
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/pdflscape/pdflscape-nometadata.sty
-Package: pdflscape-nometadata 2022-10-28 v0.13 Display of landscape pages in PDF (HO)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/graphics/lscape.sty
-Package: lscape 2020/05/28 v3.02 Landscape Pages (DPC)
-)
-Package pdflscape Info: Auto-detected driver: pdftex on input line 81.
-)) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/tabu/tabu.sty
-Package: tabu 2019/01/11 v2.9 - flexible LaTeX tabulars (FC+tabu-fixed)
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/varwidth/varwidth.sty
-Package: varwidth 2009/03/30 ver 0.92;  Variable-width minipages
-\@vwid@box=\box64
-\sift@deathcycles=\count301
-\@vwid@loff=\dimen184
-\@vwid@roff=\dimen185
-)
-\c@taburow=\count302
-\tabu@nbcols=\count303
-\tabu@cnt=\count304
-\tabu@Xcol=\count305
-\tabu@alloc=\count306
-\tabu@nested=\count307
-\tabu@target=\dimen186
-\tabu@spreadtarget=\dimen187
-\tabu@naturalX=\dimen188
-\tabucolX=\dimen189
-\tabu@Xsum=\dimen190
-\extrarowdepth=\dimen191
-\abovetabulinesep=\dimen192
-\belowtabulinesep=\dimen193
-\tabustrutrule=\dimen194
-\tabu@thebody=\toks34
-\tabu@footnotes=\toks35
-\tabu@box=\box65
-\tabu@arstrutbox=\box66
-\tabu@hleads=\box67
-\tabu@vleads=\box68
-\tabu@cellskip=\skip64
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/threeparttable/threeparttable.sty
-Package: threeparttable 2003/06/13  v 3.0
-\@tempboxb=\box69
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/threeparttablex/threeparttablex.sty
-Package: threeparttablex 2013/07/23 v0.3 by daleif
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/environ/environ.sty
-Package: environ 2014/05/04 v0.3 A new way to define environments
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/trimspaces/trimspaces.sty
-Package: trimspaces 2009/09/17 v1.1 Trim spaces around a token list
-))
-\TPTL@width=\skip65
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/generic/ulem/ulem.sty
-\UL@box=\box70
-\UL@hyphenbox=\box71
-\UL@skip=\skip66
-\UL@hook=\toks36
-\UL@height=\dimen195
-\UL@pe=\count308
-\UL@pixel=\dimen196
-\ULC@box=\box72
-Package: ulem 2019/11/18
-\ULdepth=\dimen197
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/makecell/makecell.sty
-Package: makecell 2009/08/03 V0.1e Managing of Tab Column Heads and Cells
-\rotheadsize=\dimen198
-\c@nlinenum=\count309
-\TeXr@lab=\toks37
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/l3backend/l3backend-pdftex.def
-File: l3backend-pdftex.def 2023-04-19 L3 backend support: PDF output (pdfTeX)
-\l__color_backend_stack_int=\count310
-\l__pdf_internal_box=\box73
-) (./SM.aux)
-\openout1 = `SM.aux'.
-
-LaTeX Font Info:    Checking defaults for OML/cmm/m/it on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Font Info:    Checking defaults for OMS/cmsy/m/n on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Font Info:    Checking defaults for OT1/cmr/m/n on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Font Info:    Checking defaults for T1/cmr/m/n on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Font Info:    Checking defaults for TS1/cmr/m/n on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Font Info:    Checking defaults for OMX/cmex/m/n on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Font Info:    Checking defaults for U/cmr/m/n on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Font Info:    Checking defaults for PD1/pdf/m/n on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Font Info:    Checking defaults for PU/pdf/m/n on input line 84.
-LaTeX Font Info:    ... okay on input line 84.
-LaTeX Info: Redefining \microtypecontext on input line 84.
-Package microtype Info: Applying patch `item' on input line 84.
-Package microtype Info: Applying patch `toc' on input line 84.
-Package microtype Info: Applying patch `eqnum' on input line 84.
-Package microtype Info: Applying patch `footnote' on input line 84.
-Package microtype Info: Applying patch `verbatim' on input line 84.
-Package microtype Info: Generating PDF output.
-Package microtype Info: Character protrusion enabled (level 2).
-Package microtype Info: Using protrusion set `basicmath'.
-Package microtype Info: Automatic font expansion enabled (level 2),
-(microtype)             stretch: 20, shrink: 20, step: 1, non-selected.
-Package microtype Info: Using default expansion set `alltext-nott'.
-LaTeX Info: Redefining \showhyphens on input line 84.
-Package microtype Info: No adjustment of tracking.
-Package microtype Info: No adjustment of interword spacing.
-Package microtype Info: No adjustment of character kerning.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/microtype/mt-cmr.cfg
-File: mt-cmr.cfg 2013/05/19 v2.2 microtype config. file: Computer Modern Roman (RS)
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/epstopdf-pkg/epstopdf-base.sty
-Package: epstopdf-base 2020-01-24 v2.11 Base part for package epstopdf
-Package epstopdf-base Info: Redefining graphics rule for `.eps' on input line 485.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/latexconfig/epstopdf-sys.cfg
-File: epstopdf-sys.cfg 2010/07/13 v1.3 Configuration of (r)epstopdf for TeX Live
-))
-Package hyperref Info: Link coloring OFF on input line 84.
-(./SM.out) (./SM.out)
-\@outlinefile=\write3
-\openout3 = `SM.out'.
-
-*geometry* driver: auto-detecting
-*geometry* detected driver: pdftex
-*geometry* verbose mode - [ preamble ] result:
-* driver: pdftex
-* paper: <default>
-* layout: <same size as paper>
-* layoutoffset:(h,v)=(0.0pt,0.0pt)
-* modes: 
-* h-part:(L,W,R)=(72.26999pt, 469.75502pt, 72.26999pt)
-* v-part:(T,H,B)=(72.26999pt, 650.43001pt, 72.26999pt)
-* \paperwidth=614.295pt
-* \paperheight=794.96999pt
-* \textwidth=469.75502pt
-* \textheight=650.43001pt
-* \oddsidemargin=0.0pt
-* \evensidemargin=0.0pt
-* \topmargin=-37.0pt
-* \headheight=12.0pt
-* \headsep=25.0pt
-* \topskip=10.0pt
-* \footskip=30.0pt
-* \marginparwidth=65.0pt
-* \marginparsep=11.0pt
-* \columnsep=10.0pt
-* \skip\footins=9.0pt plus 4.0pt minus 2.0pt
-* \hoffset=0.0pt
-* \voffset=0.0pt
-* \mag=1000
-* \@twocolumnfalse
-* \@twosidefalse
-* \@mparswitchfalse
-* \@reversemarginfalse
-* (1in=72.27pt=25.4mm, 1cm=28.453pt)
-
-LaTeX Font Info:    Trying to load font information for OT1+lmr on input line 86.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/lm/ot1lmr.fd
-File: ot1lmr.fd 2015/05/01 v1.6.1 Font defs for Latin Modern
-)
-LaTeX Font Info:    Trying to load font information for OML+lmm on input line 86.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/lm/omllmm.fd
-File: omllmm.fd 2015/05/01 v1.6.1 Font defs for Latin Modern
-)
-LaTeX Font Info:    Trying to load font information for OMS+lmsy on input line 86.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/lm/omslmsy.fd
-File: omslmsy.fd 2015/05/01 v1.6.1 Font defs for Latin Modern
-)
-LaTeX Font Info:    Trying to load font information for OMX+lmex on input line 86.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/lm/omxlmex.fd
-File: omxlmex.fd 2015/05/01 v1.6.1 Font defs for Latin Modern
-)
-LaTeX Font Info:    External font `lmex10' loaded for size
-(Font)              <12> on input line 86.
-LaTeX Font Info:    External font `lmex10' loaded for size
-(Font)              <8> on input line 86.
-LaTeX Font Info:    External font `lmex10' loaded for size
-(Font)              <6> on input line 86.
-LaTeX Font Info:    Trying to load font information for U+msa on input line 86.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsfonts/umsa.fd
-File: umsa.fd 2013/01/14 v3.01 AMS symbols A
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/microtype/mt-msa.cfg
-File: mt-msa.cfg 2006/02/04 v1.1 microtype config. file: AMS symbols (a) (RS)
-)
-LaTeX Font Info:    Trying to load font information for U+msb on input line 86.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/amsfonts/umsb.fd
-File: umsb.fd 2013/01/14 v3.01 AMS symbols B
-) (/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/microtype/mt-msb.cfg
-File: mt-msb.cfg 2005/06/01 v1.0 microtype config. file: AMS symbols (b) (RS)
-) (./SM.toc
-LaTeX Font Info:    External font `lmex10' loaded for size
-(Font)              <10> on input line 1.
-LaTeX Font Info:    External font `lmex10' loaded for size
-(Font)              <7> on input line 1.
-LaTeX Font Info:    External font `lmex10' loaded for size
-(Font)              <5> on input line 1.
-)
-\tf@toc=\write4
-\openout4 = `SM.toc'.
-
-[1
-
-{/Users/acristia/Library/TinyTeX/texmf-var/fonts/map/pdftex/updmap/pdftex.map}{/Users/acristia/Library/TinyTeX/texmf-dist/fonts/enc/dvips/lm/lm-ec.enc}]
-LaTeX Font Info:    Trying to load font information for TS1+lmr on input line 130.
-(/Users/acristia/Library/TinyTeX/texmf-dist/tex/latex/lm/ts1lmr.fd
-File: ts1lmr.fd 2015/05/01 v1.6.1 Font defs for Latin Modern
-)
-<SM_files/figure-latex/icc-sim-plot-1.pdf, id=156, 440.64626pt x 251.94125pt>
-File: SM_files/figure-latex/icc-sim-plot-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/icc-sim-plot-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/icc-sim-plot-1.pdf  used on input line 166.
-(pdftex.def)             Requested size: 440.64517pt x 251.94063pt.
-[2{/Users/acristia/Library/TinyTeX/texmf-dist/fonts/enc/dvips/lm/lm-ts1.enc}] [3
-pdfTeX warning (ext4): destination with the same identifier (name{figure.1}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.239 
-       <./SM_files/figure-latex/icc-sim-plot-1.pdf>] [4]
-<SM_files/figure-latex/icc-examples-fig1-1.pdf, id=183, 423.5825pt x 315.1775pt>
-File: SM_files/figure-latex/icc-examples-fig1-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/icc-examples-fig1-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/icc-examples-fig1-1.pdf  used on input line 361.
-(pdftex.def)             Requested size: 423.59439pt x 315.18634pt.
-[5
-pdfTeX warning (ext4): destination with the same identifier (name{table.1}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.423 \end{quote}
-                 
-pdfTeX warning (ext4): destination with the same identifier (name{table.2}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.423 \end{quote}
-                 ] [6
-pdfTeX warning (ext4): destination with the same identifier (name{figure.2}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.423 \end{quote}
-                  <./SM_files/figure-latex/icc-examples-fig1-1.pdf>]
-<SM_files/figure-latex/r-fig4-1.pdf, id=210, 271.0125pt x 206.7725pt>
-File: SM_files/figure-latex/r-fig4-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/r-fig4-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/r-fig4-1.pdf  used on input line 454.
-(pdftex.def)             Requested size: 271.0201pt x 206.77829pt.
-[7
-pdfTeX warning (ext4): destination with the same identifier (name{table.3}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.471 
-      {/Users/acristia/Library/TinyTeX/texmf-dist/fonts/enc/dvips/lm/lm-mathit.enc}{/Users/acristia/Library/TinyTeX/texmf-dist/fonts/enc/dvips/lm/lm-rm.enc}{/Users/acristia/Library/TinyTeX/texmf-dist/fonts/enc/dvips/lm/lm-mathsy.enc}
-pdfTeX warning (ext4): destination with the same identifier (name{figure.3}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.471 
-       <./SM_files/figure-latex/r-fig4-1.pdf>] [8]
-<SM_files/figure-latex/unnamed-chunk-2-1.pdf, id=239, 452.69125pt x 315.1775pt>
-File: SM_files/figure-latex/unnamed-chunk-2-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/unnamed-chunk-2-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/unnamed-chunk-2-1.pdf  used on input line 578.
-(pdftex.def)             Requested size: 452.69014pt x 315.17673pt.
-<SM_files/figure-latex/icc-allexp-fig5-1.pdf, id=240, 417.56pt x 206.7725pt>
-File: SM_files/figure-latex/icc-allexp-fig5-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/icc-allexp-fig5-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/icc-allexp-fig5-1.pdf  used on input line 591.
-(pdftex.def)             Requested size: 417.5717pt x 206.77829pt.
-[9] [10
-pdfTeX warning (ext4): destination with the same identifier (name{figure.4}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.656 \begin{quote}
-                   
-pdfTeX warning (ext4): destination with the same identifier (name{figure.5}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.656 \begin{quote}
-                    <./SM_files/figure-latex/unnamed-chunk-2-1.pdf> <./SM_files/figure-latex/icc-allexp-fig5-1.pdf>]
-<SM_files/figure-latex/relBYage-fig6-1.pdf, id=276, 415.5525pt x 712.6625pt>
-File: SM_files/figure-latex/relBYage-fig6-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/relBYage-fig6-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/relBYage-fig6-1.pdf  used on input line 672.
-(pdftex.def)             Requested size: 379.28203pt x 650.45953pt.
-
-LaTeX Warning: Float too large for page by 35.97395pt on input line 675.
-
-<SM_files/figure-latex/icc-byage-fig7-1.pdf, id=277, 277.035pt x 424.58624pt>
-File: SM_files/figure-latex/icc-byage-fig7-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/icc-byage-fig7-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/icc-byage-fig7-1.pdf  used on input line 735.
-(pdftex.def)             Requested size: 277.03432pt x 424.5852pt.
-<SM_files/figure-latex/icc-bycor-fig8-1.pdf, id=278, 568.1225pt x 269.005pt>
-File: SM_files/figure-latex/icc-bycor-fig8-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/icc-bycor-fig8-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/icc-bycor-fig8-1.pdf  used on input line 764.
-(pdftex.def)             Requested size: 469.7731pt x 222.43672pt.
-[11
-pdfTeX warning (ext4): destination with the same identifier (name{table.4}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.767 \end{figure}
-                  ] [12
-pdfTeX warning (ext4): destination with the same identifier (name{figure.6}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.767 \end{figure}
-                   <./SM_files/figure-latex/relBYage-fig6-1.pdf>] [13
-pdfTeX warning (ext4): destination with the same identifier (name{table.5}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.767 \end{figure}
-                  
-pdfTeX warning (ext4): destination with the same identifier (name{figure.7}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.767 \end{figure}
-                   <./SM_files/figure-latex/icc-byage-fig7-1.pdf>]
-<SM_files/figure-latex/icc-bycor-fig9-1.pdf, id=323, 566.115pt x 280.04625pt>
-File: SM_files/figure-latex/icc-bycor-fig9-1.pdf Graphic file (type pdf)
-<use SM_files/figure-latex/icc-bycor-fig9-1.pdf>
-Package pdftex.def Info: SM_files/figure-latex/icc-bycor-fig9-1.pdf  used on input line 830.
-(pdftex.def)             Requested size: 469.76303pt x 232.38275pt.
-[14
-pdfTeX warning (ext4): destination with the same identifier (name{figure.8}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.847 \end{quote}
-                  <./SM_files/figure-latex/icc-bycor-fig8-1.pdf>] [15
-pdfTeX warning (ext4): destination with the same identifier (name{table.6}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.847 \end{quote}
-                 
-pdfTeX warning (ext4): destination with the same identifier (name{figure.9}) has been already used, duplicate ignored
-<argument> ...shipout:D \box_use:N \l_shipout_box 
-                                                  \__shipout_drop_firstpage_...
-l.847 \end{quote}
-                  <./SM_files/figure-latex/icc-bycor-fig9-1.pdf>]
-Underfull \hbox (badness 10000) in paragraph at lines 925--928
-\T1/lmr/m/n/10 (+20) / / neuroscienceblueprint . nih . gov / resources -[] tools / blueprint -[] resources -[] tools -[] library / nih -[] infant -[] and -[] toddler -[]
- []
-
-[16] [17] (./SM.aux)
- ***********
-LaTeX2e <2023-06-01> patch level 1
-L3 programming layer <2023-08-29>
- ***********
-Package rerunfilecheck Info: File `SM.out' has not changed.
-(rerunfilecheck)             Checksum: D33D4981B574B2D7DE96A80028D3FB55;8932.
- ) 
-Here is how much of TeX's memory you used:
- 14635 strings out of 476894
- 233587 string characters out of 5808108
- 1938807 words of memory out of 5000000
- 35444 multiletter control sequences out of 15000+600000
- 612603 words of font info for 147 fonts, out of 8000000 for 9000
- 14 hyphenation exceptions out of 8191
- 75i,9n,79p,999b,533s stack positions out of 10000i,1000n,20000p,200000b,200000s
-</Users/acristia/Library/TinyTeX/texmf-dist/fonts/type1/public/lm/lmbx12.pfb></Users/acristia/Library/TinyTeX/texmf-dist/fonts/type1/public/lm/lmmi10.pfb></Users/acristia/Library/TinyTeX/texmf-dist/fonts/type1/public/lm/lmmi7.pfb></Users/acristia/Library/TinyTeX/texmf-dist/fonts/type1/public/lm/lmr10.pfb></Users/acristia/Library/TinyTeX/texmf-dist/fonts/type1/public/lm/lmr17.pfb></Users/acristia/Library/TinyTeX/texmf-dist/fonts/type1/public/lm/lmsy10.pfb>
-Output written on SM.pdf (17 pages, 537622 bytes).
-PDF statistics:
- 444 PDF objects out of 1000 (max. 8388607)
- 380 compressed objects within 4 object streams
- 90 named destinations out of 1000 (max. 500000)
- 30990 words of extra memory for PDF output out of 35830 (max. 10000000)
-

+ 5 - 3
CODE/create-all-rs.R

@@ -17,7 +17,9 @@ mydat_lena = merge(mydat_lena,dist_contig_lena[,c("session_id","next_session")],
 #sum(table(dist_contig_lena$experiment[!duplicated(dist_contig_lena$child_id)])) #and overall
 # maximally, we'll have 148 rows in the samples below
 
-#given those two numbers, with 5 draws we'd cover many combinations in winni, lucid, & trio; but we'll do more because there are a lot of recs in cougar & bergelson. Later increased to 20 bc there was a lot of variability still in the average r
+#given those two numbers, with 5 draws we'd cover many combinations in winni, lucid, & trio; 
+# but we'll do more because there are a lot of recs in cougar & bergelson. 
+# Later increased to 20 bc there was a lot of variability still in the average r
 
 mydat_aclew <- read.csv(paste0('../data_output/', "aclew",'_metrics_scaled.csv')) #1254
 #mydat_aclew=mydat_aclew[order(mydat_aclew$experiment,mydat_aclew$child_id,mydat_aclew$age),]
@@ -49,7 +51,7 @@ mydat_aclew = merge(mydat_aclew,dist_contig_aclew[,c("session_id","next_session"
 nsamples=20
 
 all_rs=data.frame(matrix(NA,nrow=dim(df.icc.mixed)[1],ncol=(nsamples))) 
-# it should have as many rows as there are ICCs, namely number of metrics = 71
+# it should have as many rows as there are ICCs, namely number of metrics = 75
 colnames(all_rs[,1:nsamples])<-paste0("sample",1:nsamples)
 all_rs$data_set<-df.icc.mixed$data_set
 all_rs$metric<-df.icc.mixed$metric
@@ -62,7 +64,7 @@ all_iccs$metric<-df.icc.mixed$metric
 
 #dist_contig_lena[,c("child_id","age","age_dist_next_rec")]
 table(dist_contig_lena[,c("age_dist_next_rec")]) # FYI
-table(dist_contig_lena[,c("age")]) # FYI
+hist(as.numeric(unlist(dist_contig_lena[,c("age")]))) # FYI
 
 for(i in 1:nsamples){#i=1
   

BIN
CODE/fig1.png


BIN
CODE/fig4.png


BIN
CODE/fig5.png


BIN
CODE/fig6.png


BIN
CODE/fig7.png


BIN
CODE/fig8.png


BIN
CODE/fig9.png


+ 0 - 38
CODE/sessionInfo.txt

@@ -1,38 +0,0 @@
-R version 4.2.0 (2022-04-22)
-Platform: x86_64-apple-darwin17.0 (64-bit)
-Running under: macOS Big Sur/Monterey 10.16
-
-Matrix products: default
-BLAS:   /Library/Frameworks/R.framework/Versions/4.2/Resources/lib/libRblas.0.dylib
-LAPACK: /Library/Frameworks/R.framework/Versions/4.2/Resources/lib/libRlapack.dylib
-
-locale:
-[1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
-
-attached base packages:
-[1] stats     graphics  grDevices utils     datasets  methods   base     
-
-other attached packages:
- [1] ggbeeswarm_0.7.1  car_3.1-1         carData_3.0-5     stringr_1.5.0    
- [5] tidyr_1.2.1       dplyr_1.0.10      psych_2.2.9       kableExtra_1.3.4 
- [9] ggpubr_0.5.0      ggthemes_4.2.4    ggplot2_3.4.0     performance_0.9.0
-[13] lme4_1.1-31       Matrix_1.5-3     
-
-loaded via a namespace (and not attached):
- [1] Rcpp_1.0.9        svglite_2.1.0     lattice_0.20-45   assertthat_0.2.1 
- [5] digest_0.6.31     utf8_1.2.2        R6_2.5.1          backports_1.4.1  
- [9] evaluate_0.19     highr_0.10        httr_1.4.4        pillar_1.8.1     
-[13] rlang_1.0.6       rstudioapi_0.14   minqa_1.2.5       nloptr_2.0.3     
-[17] rmarkdown_2.19    labeling_0.4.2    splines_4.2.0     webshot_0.5.4    
-[21] munsell_0.5.0     broom_1.0.2       vipor_0.4.5       compiler_4.2.0   
-[25] xfun_0.36         pkgconfig_2.0.3   systemfonts_1.0.4 mnormt_2.1.1     
-[29] mgcv_1.8-40       htmltools_0.5.4   insight_0.17.1    tidyselect_1.2.0 
-[33] gridExtra_2.3     tibble_3.1.8      fansi_1.0.3       viridisLite_0.4.1
-[37] withr_2.5.0       MASS_7.3-56       grid_4.2.0        nlme_3.1-157     
-[41] gtable_0.3.1      lifecycle_1.0.3   DBI_1.1.2         magrittr_2.0.3   
-[45] scales_1.2.1      cli_3.5.0         stringi_1.7.8     farver_2.1.1     
-[49] ggsignif_0.6.4    xml2_1.3.3        generics_0.1.3    vctrs_0.5.1      
-[53] cowplot_1.1.1     boot_1.3-28       tools_4.2.0       beeswarm_0.4.0   
-[57] glue_1.6.2        purrr_1.0.0       abind_1.4-5       parallel_4.2.0   
-[61] fastmap_1.1.0     yaml_2.3.6        colorspace_2.0-3  rstatix_0.7.1    
-[65] rvest_1.0.3       knitr_1.41       

+ 78 - 0
data_output/all_rs.csv

@@ -1,4 +1,5 @@
 "X1","X2","X3","X4","X5","X6","X7","X8","X9","X10","X11","X12","X13","X14","X15","X16","X17","X18","X19","X20","data_set","metric"
+<<<<<<< HEAD
 0.514956977969716,0.563744701216287,0.525971430582757,0.503452380233829,0.592771575309432,0.577479558038973,0.642940591504311,0.57122626461789,0.539493475370991,0.582039030298194,0.492423873952027,0.575671448940038,0.567066523327573,0.568242518572264,0.545582150802406,0.589180554422384,0.549768871820702,0.531581330400875,0.532184350618511,0.501716076090499,"aclew","wc_adu_ph"
 0.454071162360524,0.416643085255234,0.51533218912316,0.497063740374322,0.591178498094461,0.471474384596598,0.522868299409386,0.50036765480733,0.501438535746882,0.547862286324877,0.472576246450398,0.510839534253933,0.437894885070397,0.493173218253865,0.514134236371331,0.567551797533735,0.520590013113675,0.502958346383655,0.494607071492018,0.439444364379745,"aclew","sc_mal_ph"
 0.60744380590414,0.623856925303961,0.54062580484287,0.55472480161382,0.593846071676229,0.607708294249994,0.58955399461157,0.4950946361123,0.575656311630062,0.539511217976342,0.575363709505421,0.555682618490975,0.55506906381151,0.581382045925099,0.578563624653707,0.592981973159342,0.640648579918711,0.571084849328106,0.558285903519239,0.510690830649518,"aclew","sc_fem_ph"
@@ -74,3 +75,80 @@
 0.514674874112739,0.463872063365489,0.382343729503505,0.505179002037924,0.647481248001895,0.514252742479428,0.351661746285737,0.403323626273577,0.502829551834331,0.502668849325504,0.462302102757342,0.306867628625978,0.415661956926733,0.541541974013581,0.449488633955382,0.299640143665633,0.502540276769894,0.604939869917928,0.450664771123084,0.437438198817996,"lena","standardScore"
 0.724467792452633,0.635598483391995,0.693338144883635,0.737890602864552,0.667514767141115,0.687357786792968,0.687703695902893,0.742686061759789,0.704225016614418,0.681940831486715,0.668915328546687,0.749318583234338,0.701987009492323,0.668156090147111,0.684059709119377,0.661727902964816,0.724959702737149,0.613448433738284,0.733768200879471,0.699212927412113,"lena","lena_CTC_ph"
 0.723493205249348,0.697532746867757,0.668015827634027,0.750685429486053,0.709808193328942,0.64039580687794,0.711237726043676,0.732061943169949,0.691319540642723,0.702636737831559,0.704118625740177,0.738517275519931,0.665268328690606,0.727288662801766,0.701404390200901,0.697273711305511,0.718534463224642,0.647296647590542,0.695492737599131,0.722593704574213,"lena","lena_CVC_ph"
+=======
+0.563744701216287,0.525971430582757,0.503452380233829,0.592771575309433,0.577479558038973,0.642940591504311,0.57122626461789,0.539493475370992,0.582039030298194,0.492423873952027,0.575671448940038,0.567066523327573,0.568242518572265,0.545582150802406,0.589180554422384,0.549768871820702,0.531581330400875,0.532184350618511,0.501716076090499,0.519921974663456,"aclew","wc_adu_ph"
+0.416643085255234,0.51533218912316,0.497063740374322,0.591178498094461,0.471474384596598,0.522868299409386,0.50036765480733,0.501438535746881,0.547862286324877,0.472576246450399,0.510839534253934,0.437894885070396,0.493173218253865,0.514134236371331,0.567551797533735,0.520590013113676,0.502958346383655,0.494607071492018,0.439444364379745,0.549410108740052,"aclew","sc_mal_ph"
+0.623856925303961,0.54062580484287,0.554724801613821,0.59384607167623,0.607708294249994,0.58955399461157,0.4950946361123,0.575656311630062,0.539511217976342,0.575363709505421,0.555682618490975,0.55506906381151,0.581382045925099,0.578563624653707,0.592981973159342,0.640648579918711,0.571084849328106,0.558285903519239,0.510690830649518,0.572455120147726,"aclew","sc_fem_ph"
+0.409995609387468,0.510338182131191,0.486450751205043,0.583515143596572,0.4702179808776,0.519274100005391,0.498202497040722,0.505042641406648,0.545207557735081,0.460438809035565,0.508254560818523,0.431286147794675,0.492716552758193,0.514096181113093,0.58078986811978,0.529737125416281,0.511045856852237,0.492660660373013,0.434700772038992,0.561141358877975,"aclew","wc_mal_ph"
+0.618545460689729,0.538651399072411,0.550073425134171,0.588960992728224,0.61685127983049,0.596794575012263,0.490719972563589,0.587764411316614,0.536838233451771,0.586824465022846,0.549664569846853,0.550812138441851,0.58274680029187,0.578317047217438,0.593486845415488,0.633032385125835,0.565887572830481,0.568657662905797,0.519801321589111,0.570204368496266,"aclew","wc_fem_ph"
+0.3222050402233,0.312059934928461,0.22296094732941,0.340147116993338,0.364032075277043,0.227903225787643,0.331651357926202,0.271989987897116,0.326048530729583,0.284229843787486,0.209450238239734,0.354077688755946,0.369147925371943,0.232277674612284,0.296446289112658,0.364023135131947,0.240408190764673,0.158384485587889,0.239316184735695,0.327636550435609,"aclew","peak_wc_fem"
+0.328783822266324,0.329603318615888,0.304817054766407,0.368922721745463,0.388067644146306,0.356370343982615,0.350121547151173,0.436756218290525,0.438616411193787,0.278165486453434,0.328887782639158,0.369983551260125,0.359134968864209,0.406384294163892,0.451634303974696,0.298782133765761,0.370919448201219,0.340941745195926,0.300649604242011,0.430268416980474,"aclew","peak_wc_mal"
+0.251270380733209,0.264489417179844,0.18588946656517,0.282486683717321,0.288817799882905,0.292077526700396,0.378190097175596,0.281580188871879,0.265800379947704,0.258785976819927,0.244619714519527,0.307539202287948,0.245718863434612,0.302742771090831,0.220968074654578,0.144135620270579,0.253558839744958,0.166684406775242,0.264519914406125,0.322812659792386,"aclew","peak_wc_adu"
+0.569154313347122,0.533682891117097,0.508831093574555,0.595335039076691,0.58003562049415,0.648947186251175,0.574291848723575,0.548825632106,0.589004529725622,0.498902142013653,0.581185791252215,0.574064323777902,0.57031334119447,0.551804092696188,0.590081859535413,0.555797831436617,0.538727391210747,0.538449358391666,0.511443108935004,0.526902598331215,"aclew","sc_adu_ph"
+0.568085421558203,0.532163353275416,0.50895545693479,0.596963031453518,0.582120235442167,0.647471002167913,0.579350351756224,0.545731445140159,0.588359810481756,0.498806213999138,0.582346981795963,0.572016233979889,0.572732787904484,0.551544693764168,0.593614620187932,0.556089134847895,0.536833080599535,0.539653156576613,0.508977330996001,0.527241855466449,"aclew","pc_adu_ph"
+0.624543074576438,0.545722890942746,0.556923250940681,0.592617310167979,0.622195219519041,0.603225900057828,0.497357241828521,0.591652144509599,0.5441069215985,0.591090795985835,0.556432397307222,0.557269218266729,0.586705264190521,0.583995318170169,0.600459305601605,0.638250562783884,0.572114153468442,0.574749936931428,0.526607430019331,0.577626002691877,"aclew","pc_fem_ph"
+0.412407372282287,0.512433831300368,0.511873974622775,0.592634100402089,0.473919173521041,0.521497047396641,0.502339897135917,0.520126249863827,0.547309497991841,0.473486921390159,0.510471864543098,0.434204701889369,0.451121011024019,0.515945996981484,0.579683360433923,0.529088826493948,0.511613647409361,0.494454020675438,0.436541952599067,0.560144359975611,"aclew","pc_mal_ph"
+0.805459505293445,0.853550032509682,0.813069836761214,0.767985633544625,0.761304170639184,0.762571137914819,0.802329182297835,0.808060976544563,0.802342492863331,0.771130745356674,0.815447705566579,0.779142018686698,0.806977696867667,0.808095122730841,0.807796002621576,0.832297872016938,0.767529886442811,0.819154903719279,0.789411685260068,0.785789269433844,"aclew","can_voc_chi_ph"
+0.558775343450323,0.478223549799328,0.53377530366097,0.480024507657949,0.505111192860029,0.475047514267117,0.504943205238094,0.517192488490542,0.436340884408221,0.513046600497162,0.53184215268911,0.486452959533396,0.542002860036901,0.502944900567508,0.466410477262084,0.486997585796251,0.476688375276069,0.510592386506567,0.459310544745964,0.453897848212696,"aclew","cry_voc_chi_ph"
+0.762317655392172,0.773629386583529,0.807313309044921,0.731206223987224,0.670378070668104,0.712161527016787,0.770412314251489,0.753567128474685,0.762713383064227,0.731973977307766,0.753508249756244,0.731202953941381,0.780639483102847,0.763748531544185,0.748497438673731,0.805129836561288,0.705149471214601,0.770480367705703,0.733992810824964,0.720650989093741,"aclew","can_voc_dur_chi_ph"
+0.560785946582761,0.524651163445485,0.63494566535634,0.517129020073855,0.523666664062182,0.647101288158205,0.586194620871481,0.643552310827299,0.655901470841549,0.604914090294954,0.649630440960945,0.597204730468499,0.6548680604177,0.535978490117409,0.577111710214784,0.621798586737807,0.638580413851964,0.582505489738037,0.533987881682835,0.541730051017187,"aclew","avg_can_voc_dur_chi"
+0.634605658364187,0.692825057591668,0.63645398810317,0.72163885643533,0.589857132730738,0.658281085267822,0.652289219478783,0.647537718892409,0.663932338728843,0.568432136722614,0.711800494221145,0.648943983754027,0.653799334450547,0.659337711603197,0.705469969349028,0.67247496536814,0.635086274996596,0.639090886506477,0.689460043423256,0.627987829703814,"aclew","non_can_voc_chi_ph"
+0.621973933703232,0.675704734556044,0.636292273760912,0.68973507440383,0.603146973672804,0.67341626947081,0.639817700452688,0.63918958475856,0.64945794552826,0.580148858722549,0.691380507410264,0.626026883384085,0.636363294533376,0.669760257894985,0.69898696978772,0.637613477605975,0.620030470618626,0.654009589287115,0.646942730696499,0.60984017469869,"aclew","non_can_voc_dur_chi_ph"
+0.500082027728531,0.551785875458969,0.503240712876565,0.513094865669125,0.576787116209656,0.558317173778955,0.526866710149402,0.557031249847188,0.523875561332612,0.538254724986203,0.571525841079245,0.566967165121223,0.478738853411478,0.458980985092496,0.580658728723594,0.576578295452479,0.615110650373416,0.565038167350548,0.478800184918283,0.461572317456219,"aclew","avg_non_can_voc_dur_chi"
+0.536160464205058,0.40292859355782,0.521774482081191,0.397405860516334,0.481425593640985,0.503985713205108,0.411959654758617,0.426225705755156,0.480293869525321,0.477832797936293,0.409158246328431,0.403245765766393,0.490631410119348,0.53868515186307,0.512274032640272,0.530966114894488,0.518820153189832,0.437108619568532,0.36402312668394,0.448067662068382,"aclew","lp_n"
+0.471972559297468,0.453237504370271,0.560383304976782,0.485241347788393,0.422328651051034,0.487204239923691,0.444060162507449,0.420185755373799,0.505023000401709,0.473107702809308,0.41991245225398,0.410315739698772,0.520833384000972,0.516806327928826,0.532917333199025,0.517929227055006,0.541310155751209,0.38491444908078,0.377088423972373,0.425340296761993,"aclew","lp_dur"
+0.764088798553398,0.705123509039246,0.773229824468831,0.6736735425919,0.762336113838847,0.652349693260088,0.771745180406618,0.719328661602541,0.707401909266811,0.733502194974017,0.73273532045883,0.736740847850495,0.731450124257904,0.760200318401558,0.751329727656444,0.74736178168706,0.665839563423871,0.726412676351454,0.736094835523757,0.694738730450553,"aclew","cp_n"
+0.71898788323355,0.653631045997613,0.723505272436522,0.629428734830478,0.738437824784772,0.627130896868229,0.70394266472892,0.656885947990794,0.655098176259349,0.699178023852168,0.669505163536582,0.698510393187217,0.704875463889374,0.703843261595945,0.706063117205952,0.705593786409235,0.648606912874211,0.675373338966844,0.669072854819628,0.658480171249756,"aclew","cp_dur"
+0.520254021515901,0.623455921534492,0.558988310256889,0.609208373584932,0.512370889879785,0.575505767971488,0.582134245247768,0.521647027804582,0.530269924759634,0.620067712422063,0.6167847547,0.508475328776737,0.610819952814321,0.533115322397369,0.507456558400073,0.568092736409478,0.602522703242066,0.610243090959404,0.436259727960763,0.561376520415862,"aclew","avg_cry_voc_dur_chi"
+0.596773739324188,0.543011654069975,0.582362892425719,0.516567932934974,0.512553516541952,0.516733100973558,0.528549854993053,0.554601085191362,0.463284997450611,0.568776087293532,0.543250750719489,0.511597658204418,0.604439235255224,0.505335046483145,0.474642800944769,0.540290629181635,0.571127659135166,0.522856594543378,0.474344201119856,0.436529722080083,"aclew","cry_voc_dur_chi_ph"
+0.67642278122811,0.650235335542527,0.63289114125847,0.698423643342167,0.665391588639897,0.690560831062713,0.706674186835948,0.66739813139353,0.679868269324616,0.673890400883986,0.718101177283261,0.672604754785653,0.706579846690095,0.655273202256678,0.713129054331586,0.698329332805902,0.64093810907742,0.692695962972803,0.661563313833427,0.670706476527234,"aclew","voc_fem_ph"
+0.385924560544755,0.397877945541797,0.271993481829835,0.463467862276036,0.326331683661567,0.30856617894889,0.532146804341895,0.385636339427868,0.392915186158719,0.3749887268187,0.363838272820678,0.397204557847419,0.432641018643323,0.289689393306845,0.347644288797615,0.37512872089502,0.258062440879496,0.344182443561966,0.36828223479918,0.364075343876161,"aclew","peak_voc_fem"
+0.457878410815907,0.519246778287842,0.469861959180112,0.653792607028568,0.566152540372533,0.579095649315059,0.634125614796009,0.600340066186205,0.661616739432527,0.524825889839146,0.543047435328301,0.550992248338118,0.538796686989277,0.541562021079575,0.566303911402961,0.531959626399694,0.516953773264407,0.537714245759343,0.565130417801082,0.546958014232599,"aclew","voc_mal_ph"
+0.703420710919502,0.679859144110372,0.600042644398157,0.655110255935954,0.56185914088316,0.613779732860626,0.668936193290319,0.588925643884017,0.654720667228016,0.637983330743261,0.667715734319248,0.618656423381066,0.6574256828032,0.670309190108829,0.633315045754006,0.680241044790779,0.58936288865026,0.662435540920276,0.669323298739891,0.615725048274679,"aclew","peak_simple_CTC"
+0.780474988230087,0.736967831313103,0.774948582308732,0.809721789260533,0.777066035706323,0.744249497365171,0.792131138180702,0.755047823361634,0.753653409524792,0.743237844222133,0.812676974313951,0.777521845728702,0.774474730389285,0.756744397684685,0.732055074471672,0.789229100582446,0.764910997238315,0.774292978328385,0.742019748640869,0.747605031602261,"aclew","voc_och_ph"
+0.719846859111818,0.612354210034068,0.619794303082141,0.704366579107451,0.649355023198546,0.618233278192652,0.698673928408857,0.681952519170603,0.573115627313923,0.625629369728263,0.688174794232266,0.602803435332205,0.687852742372292,0.656172419406979,0.675345882733444,0.694113396927643,0.683967390501495,0.675921596043818,0.656707514378964,0.63300618122807,"aclew","peak_voc_och"
+0.688335572292661,0.718383890018228,0.683190083369334,0.734751951893677,0.616098888781895,0.689462694148258,0.704826076987046,0.679089068877864,0.708190937085788,0.635990468089049,0.749411595857203,0.689072307223663,0.711060206495477,0.688898210244804,0.699559532547738,0.701617481390255,0.657893100145003,0.676814057691932,0.715651154692895,0.662214814716108,"aclew","voc_chi_ph"
+0.64644608411566,0.652356954781485,0.567004744678091,0.601767721482991,0.513381336683878,0.552965283098975,0.614592413044375,0.570598971152563,0.599267822862678,0.586362793497837,0.646863705071988,0.632287139786669,0.571074576537507,0.633372671345156,0.568269722022662,0.620818842514789,0.589585122364277,0.625776279461508,0.671739466947045,0.59224264822119,"aclew","peak_voc_chi"
+0.37738503293213,0.358232330837139,0.253076181277259,0.401727817180259,0.409008314756607,0.401004553363268,0.37328885351539,0.35731700503618,0.498959536317855,0.312637024197299,0.429834320619208,0.40218153414165,0.315850267819196,0.355500899775946,0.404750215996279,0.279884157529219,0.329667447491777,0.28801348419087,0.320820123083396,0.429145090169145,"aclew","peak_voc_mal"
+0.41164257065729,0.479641712036116,0.444799987968187,0.6184600175909,0.510890602078329,0.56607008434508,0.537543828260123,0.551754768593842,0.634655641744801,0.5678309823274,0.513898391867727,0.503910463081004,0.540764534321028,0.506271773521366,0.578459503990369,0.509669430850684,0.524484432585359,0.548300147372987,0.513141423650995,0.56338262079174,"aclew","voc_dur_mal_ph"
+0.775211074029269,0.724944716035553,0.76897816563562,0.777658099034006,0.738828663574653,0.702553986526182,0.772451204023906,0.742122896540219,0.731488474395282,0.723195396373732,0.78248304448843,0.752659560166617,0.733263195260179,0.726865600244635,0.664518249620336,0.7554697905541,0.751973871055236,0.748100787037682,0.730991306204573,0.737316907439113,"aclew","voc_dur_och_ph"
+0.708745500243963,0.736918148151125,0.752688965068398,0.728484246403939,0.626360848497273,0.718275291539139,0.694203610335758,0.703810792057043,0.686733842512463,0.669158590456942,0.736769923958224,0.676539110540013,0.735097108855217,0.710781227728438,0.666640252187855,0.711954448755433,0.687867829733402,0.693002646194955,0.692676331243829,0.682610211245061,"aclew","voc_dur_chi_ph"
+0.456952390841685,0.432335663743403,0.541863564526901,0.609346472668207,0.480414588748178,0.521706656599047,0.574240246186687,0.503906001261885,0.419597684789231,0.489809401289438,0.54307773649638,0.502097310529312,0.528905851547599,0.429127533711739,0.465459083030913,0.471876129428944,0.349329475757884,0.437058860055576,0.498492624743002,0.428922161407547,"aclew","avg_voc_dur_fem"
+0.444124569754123,0.470513614123499,0.473068586307389,0.502944762299035,0.474514981027506,0.5188859088533,0.494309389044907,0.645400795022864,0.469719372685491,0.537206918208407,0.512653656173,0.397020419405271,0.552273578878179,0.516001088399302,0.457804384336194,0.479581204411402,0.532271886095274,0.503480830640904,0.49574517692668,0.51627804234281,"aclew","avg_voc_dur_mal"
+0.70415466881598,0.636798527108916,0.66320980142884,0.707034188429745,0.656159814503535,0.647626748786253,0.705251281714332,0.685586408417439,0.616459840717675,0.637852788090831,0.657794211184733,0.65763405074612,0.618164891469976,0.623889650322507,0.623512817740204,0.660229950592527,0.697790534781386,0.699195082812113,0.693024196237678,0.636767845492826,"aclew","avg_voc_dur_och"
+0.626072665604682,0.530378149335105,0.664839988949207,0.568123427990754,0.585026185260148,0.664271769352599,0.614962622271652,0.653345004475813,0.608766936685168,0.636316207247499,0.6745105192045,0.62257920677784,0.594878126141789,0.609257782186338,0.668734329815781,0.644147542712362,0.686650662214933,0.569969275773014,0.577388249501231,0.600614218724645,"aclew","avg_voc_dur_chi"
+0.600560009685579,0.508583658434065,0.555940663656364,0.631000968329319,0.598798332311116,0.612243391633638,0.59501386546207,0.586663705282806,0.562123422471691,0.591400060958242,0.588684249654415,0.585060855444436,0.633005080892078,0.55259354759516,0.568805235732638,0.595342829461703,0.52352221890042,0.579636408132323,0.547782212595295,0.54238353087072,"aclew","voc_dur_fem_ph"
+0.749274426090442,0.749711862363772,0.752563930884069,0.789082165044361,0.725157628475316,0.770939026894618,0.794043352616229,0.750670235321324,0.751042993679118,0.750891295253277,0.79963776485252,0.764053382264747,0.784412038440408,0.745911217966578,0.745639180835196,0.76226990172277,0.725090971030278,0.761725724291897,0.767890406987292,0.738306178168285,"aclew","simple_CTC_ph"
+0.544631119207252,0.498760160652994,0.579404038504558,0.585592718633337,0.577860011022351,0.573453835148534,0.619495370553327,0.574648213969999,0.570482938368478,0.546598841749175,0.577152805526624,0.619823478758052,0.601106972797835,0.517498227378343,0.567176278230629,0.609237975860836,0.491011246700207,0.54310611083946,0.50572333080369,0.513154373550789,"lena","voc_fem_ph"
+0.696758086752187,0.645189786079152,0.641425054321643,0.629453963277946,0.592555542265142,0.644511920607656,0.658923176694353,0.580677349116494,0.623689877019895,0.640882475134395,0.661099093221465,0.593221941963173,0.594665178059068,0.614106889293579,0.593167342291599,0.725763384050695,0.631959061798077,0.639070822456476,0.674279299217425,0.631529305919641,"lena","peak_lena_CVC"
+0.763658500781102,0.773891586458686,0.800911835303583,0.800250345170873,0.783075481663763,0.754179278523276,0.768031417382834,0.770998670324636,0.807818200876252,0.786758062920238,0.7636373819806,0.753697556930721,0.781068039805792,0.770126140655244,0.766969080995378,0.755641750312263,0.75010284381333,0.754536701655649,0.741592130919925,0.75533166840185,"lena","lp_dur"
+0.775892305953215,0.778540101181716,0.81895113527401,0.77968598559923,0.781561820944015,0.777397390085828,0.760677633238953,0.788727690483725,0.824719327683834,0.7905301880737,0.782711852829207,0.768965848172053,0.790343241539025,0.783933777661662,0.786803693321835,0.769893435356823,0.752394046882338,0.776009882632672,0.784722534577451,0.774225859636926,"lena","lp_n"
+0.439636629820268,0.404913901203166,0.550023554462268,0.594512063320651,0.479836522210031,0.425762920796798,0.501126025285965,0.44728897822116,0.486602238319865,0.46063452151003,0.551186373416827,0.364061612521885,0.38931901079635,0.475129966219148,0.341835770017199,0.519725294425534,0.48069907923344,0.507074015590539,0.378615609629221,0.442517322734341,"lena","avg_cry_voc_dur_chi"
+0.461981184260431,0.485444274549031,0.517046987205322,0.436810937326246,0.425737864119371,0.513794693217966,0.523577457889209,0.460503439963971,0.522958602367822,0.475203213207526,0.557398990067011,0.484267574700238,0.475813419516529,0.474222222465513,0.457314931184882,0.509333366280293,0.438885486344394,0.418481196537964,0.454979069064121,0.432190664863474,"lena","cry_voc_dur_chi_ph"
+0.468552399510549,0.488414853873718,0.503548805961052,0.424266701818131,0.399155468809156,0.464363856813862,0.4927485915328,0.486445709177059,0.469405637620194,0.468051481694066,0.546311588671409,0.446651693496508,0.481906915117125,0.474945807011885,0.44358840550374,0.474438486978612,0.404657673763065,0.427740621440333,0.46895088533288,0.40061292329364,"lena","cry_voc_chi_ph"
+0.29221118910306,0.333238310131762,0.396664032410664,0.312576461586514,0.339482824564949,0.327374112483269,0.414285266003601,0.446278916520041,0.367018984231649,0.304567360564912,0.333915974311184,0.456092976586314,0.358837710187657,0.232645575498345,0.22978144743025,0.377433677179335,0.230422614882585,0.296964861401757,0.338840436867077,0.372992909081037,"lena","peak_wc_adu"
+0.353712269525632,0.40607525375719,0.407186339283191,0.418602743790815,0.387132647480833,0.452766813326968,0.406363809187282,0.529121792311158,0.553496215316999,0.376730205823778,0.478798651179086,0.455980039982436,0.404257387254008,0.430945823422365,0.387049008855274,0.393306183071423,0.44181171243816,0.401528018561624,0.489128819933565,0.420702971418645,"lena","peak_wc_mal"
+0.283084968836904,0.236434680663377,0.257312295175333,0.358960070277126,0.277113251253458,0.278168451859211,0.333548005944031,0.377621862328594,0.295508719655307,0.257039648052911,0.237353668257669,0.370090155659494,0.357082014177678,0.184693780563629,0.247210927812735,0.37418596682577,0.173262884328418,0.270253234683132,0.276844582893971,0.336842303474954,"lena","peak_wc_fem"
+0.446342782355495,0.504698931066006,0.579748728260575,0.543917310822166,0.536977550040328,0.568500549168598,0.604358829971735,0.484426728586767,0.596126505311183,0.524345438243237,0.598645377869969,0.581628605283755,0.557335285172798,0.38994557880904,0.512388644824794,0.568364009261304,0.384345606485758,0.507037180560286,0.472424235433623,0.481964257603841,"lena","wc_adu_ph"
+0.495416764257919,0.395642425062681,0.475642645551151,0.387836057980293,0.45409170760701,0.475241962089334,0.481416879719821,0.559984781669361,0.622679378841084,0.551463296134509,0.535690435623764,0.390953940966402,0.520015855928099,0.488760305530557,0.438295571175104,0.422338107860466,0.426711854955899,0.410758756825009,0.548551514209281,0.346598611392662,"lena","wc_mal_ph"
+0.548912292756428,0.455231512738111,0.561493794376427,0.517597047174637,0.55752108782773,0.568002403399166,0.582219177092727,0.556043275340298,0.588996791320472,0.561771752580744,0.538754181002461,0.617474902929307,0.579678230741059,0.435322749871408,0.536512399950103,0.56409391986045,0.438012760139649,0.525041286713149,0.485945062408933,0.45038398308538,"lena","wc_fem_ph"
+0.490318137368078,0.567328407010419,0.646904954705906,0.618900487983524,0.594355026935827,0.561551332914421,0.666663187142742,0.595218819296988,0.531926101751923,0.584184002071092,0.596995166798317,0.373124786449771,0.548078767159135,0.550058838059385,0.492412585478013,0.538558770881597,0.634829128732732,0.557235591092447,0.567757921903953,0.550745042429091,"lena","avg_voc_dur_chi"
+0.416703987350695,0.406587706041473,0.430968872644221,0.432670912800272,0.374737837274107,0.400301374120868,0.381436989215389,0.418683194795644,0.366068851283697,0.346816319817315,0.461852924778205,0.35077775587906,0.41913303372982,0.410665039051536,0.411070855494646,0.370332653980733,0.442289169632383,0.361236317366322,0.506011947193841,0.463146228833003,"lena","avg_voc_dur_mal"
+0.479264498456892,0.398319461934832,0.416228797503012,0.571532062107262,0.401837408734622,0.441807201825883,0.400458521778958,0.447276962986031,0.498825040089607,0.458625150944248,0.432328467824554,0.476695084204696,0.503388313690747,0.354405910615426,0.474238605318202,0.459705328778063,0.355763731449345,0.361516846865297,0.393206280701846,0.472599811022094,"lena","avg_voc_dur_fem"
+0.616934907628417,0.601918166973835,0.668288822566744,0.61805279557086,0.533003299791367,0.609294042075418,0.612406516857663,0.602522842653481,0.583914917947506,0.624999686236764,0.652101227976341,0.527175048535465,0.670863944066618,0.585884944211583,0.613304727759077,0.643922141339968,0.578853715849266,0.588505687758261,0.613489683402696,0.572831416783597,"lena","voc_dur_chi_ph"
+0.665030122170378,0.73953518776717,0.737379028893827,0.722312118952761,0.664679195864159,0.695303728847737,0.699074038686938,0.640825349381162,0.691493325766367,0.608412025982768,0.733923919811332,0.689486277017726,0.678049190355401,0.670224146291901,0.642662826383981,0.712466729172385,0.689500557429511,0.701436018774193,0.660699624490525,0.694888119793336,"lena","voc_dur_och_ph"
+0.481438182087989,0.499339697603498,0.521765499959078,0.449726601647751,0.415491664354224,0.443743534234546,0.469448748818048,0.537673880251299,0.610337066586464,0.478811233748408,0.526506838358629,0.392284119532809,0.573059365253609,0.470675357616884,0.484413397651443,0.39403917688958,0.417718690737818,0.385245328585946,0.505948425739961,0.390799924257745,"lena","voc_dur_mal_ph"
+0.526804530556653,0.44776505063486,0.542107711185311,0.526967957568277,0.56143906129784,0.551012499575954,0.578910522472196,0.551261193891636,0.587169761657119,0.529973693270416,0.515136489450673,0.61366977467668,0.532829935726937,0.452673323274802,0.520855502606575,0.555989763864913,0.435403475897326,0.522096847563674,0.487574331901232,0.435581618101021,"lena","voc_dur_fem_ph"
+0.566611625504985,0.525770211275486,0.457873720479021,0.560021934427906,0.417797272219519,0.547179260569881,0.591096135864837,0.430339244539446,0.483560626524835,0.512844874573083,0.619521882220236,0.531273191646718,0.510365567806462,0.479989882994034,0.444448054105519,0.557318576502302,0.456022297100601,0.515027796846623,0.580505323476756,0.515273283037865,"lena","peak_voc_chi"
+0.585985512441094,0.610773630529681,0.668344551647968,0.602125495152683,0.530440073033009,0.631801891586781,0.622291783428741,0.598128488302872,0.600504177805796,0.594325656154649,0.678383598635582,0.556337765564853,0.638573434729219,0.593594951719832,0.597744632232196,0.620694646079525,0.543883135348932,0.607000557981912,0.615504085360421,0.606954847237407,"lena","voc_chi_ph"
+0.532289951406167,0.534137508625063,0.560175320081121,0.570846749881924,0.541673411821115,0.560333525590746,0.552250663271452,0.525641230163828,0.522055077430114,0.489678839023297,0.550489239283265,0.548638668377526,0.566268473110418,0.584255247716751,0.522039127670111,0.506627847158234,0.519321317039891,0.578791571063874,0.51019116561295,0.549759994007519,"lena","peak_voc_och"
+0.647380288932447,0.74520424212002,0.726716585103134,0.745906184957369,0.642159171679735,0.706006780001375,0.699623325979615,0.666369795644454,0.686804217289173,0.587301633730351,0.750446729445453,0.708956892013684,0.664542954160193,0.654711483606738,0.630378484387337,0.714881219608721,0.704547057507377,0.715080017577124,0.633218264146044,0.675968146379908,"lena","voc_och_ph"
+0.332074549164244,0.389989344642855,0.365276501608557,0.409887886333878,0.298290365236591,0.353706242169204,0.404723544833092,0.5155604556104,0.501068005820689,0.325310197418498,0.472635885764814,0.425138046567129,0.366001251141388,0.384037229722256,0.414133661984493,0.388517296927434,0.372985817271637,0.337488128410497,0.395800058117127,0.423551586492189,"lena","peak_voc_mal"
+0.487034309928276,0.38757652290954,0.424489940988794,0.417957387666436,0.436160598384062,0.404142274859563,0.487991415187703,0.52571301497637,0.592933022039014,0.496478303919758,0.539576882267025,0.350186804051403,0.519252297390047,0.442797901768391,0.466293418302343,0.343304052337942,0.326915201596124,0.38712436195036,0.533075131858983,0.353807990904881,"lena","voc_mal_ph"
+0.291684165433152,0.273424725276735,0.26770372239029,0.357344802199787,0.305670113844583,0.337084544463392,0.416165673082297,0.37586799053497,0.319303957240314,0.348238599072395,0.3214757017161,0.408797540026915,0.352482443973355,0.231927735737371,0.255166839355655,0.401433771954828,0.228845848404545,0.315723437627807,0.311058487615618,0.387157183989919,"lena","peak_voc_fem"
+0.445540488789363,0.506150551927157,0.51325877375364,0.417301682091102,0.583420255935482,0.495026979607543,0.566071397799542,0.410859116081603,0.480390679299775,0.536658243255658,0.518688600189683,0.511434812695369,0.475065198696925,0.527604948629044,0.528235304228402,0.300941278687904,0.505685847489519,0.533084164066374,0.546880286295768,0.48104834887551,"lena","avg_voc_dur_och"
+0.594960093725274,0.599230236546151,0.595049762046316,0.629742492369314,0.595853104408573,0.610603751606131,0.662293288971053,0.556855282975889,0.588735662785858,0.647560057000835,0.565504952204795,0.615952043915052,0.576532536018628,0.574290308509147,0.596380510375799,0.632187474854145,0.500564341416472,0.652903522616657,0.609605032571637,0.57690163989958,"lena","peak_lena_CTC"
+0.463872063365489,0.382343729503506,0.505179002037924,0.647481248001895,0.514252742479428,0.351661746285737,0.403323626273576,0.502829551834331,0.502668849325504,0.462302102757342,0.306867628625978,0.415661956926732,0.541541974013581,0.449488633955382,0.299640143665633,0.502540276769894,0.604939869917927,0.450664771123084,0.437438198817996,0.403004041387337,"lena","standardScore"
+0.635598483391995,0.693338144883636,0.737890602864552,0.667514767141114,0.687357786792968,0.687703695902893,0.742686061759789,0.704225016614417,0.681940831486715,0.668915328546687,0.749318583234339,0.701987009492323,0.668156090147111,0.684059709119378,0.661727902964815,0.724959702737149,0.613448433738284,0.733768200879471,0.699212927412113,0.688344555865903,"lena","lena_CTC_ph"
+0.697532746867757,0.668015827634027,0.750685429486053,0.709808193328942,0.64039580687794,0.711237726043676,0.732061943169949,0.691319540642723,0.702636737831559,0.704118625740177,0.73851727551993,0.665268328690606,0.727288662801766,0.7014043902009,0.697273711305511,0.718534463224642,0.647296647590542,0.695492737599131,0.722593704574213,0.736447241778487,"lena","lena_CVC_ph"
+>>>>>>> origin/master