Browse Source

still improving

Alejandrina Cristia 8 months ago
parent
commit
296b06d87d

+ 260 - 332
CODE/SM.Rmd

@@ -79,6 +79,7 @@ get_type<-function(mytab){
 }
 }
 ```
 ```
 
 
+
 ## Recalculate everything or not?
 ## Recalculate everything or not?
 
 
 If RECALC is set to TRUE, then the ICC tables will be re-generated and the simulation re-ran. Notice that you can only do this if you have access to underlying data. If you are not one of the paper's authors, please email us for access to reproduce this section. You do not need access to reproduce all the rest.
 If RECALC is set to TRUE, then the ICC tables will be re-generated and the simulation re-ran. Notice that you can only do this if you have access to underlying data. If you are not one of the paper's authors, please email us for access to reproduce this section. You do not need access to reproduce all the rest.
@@ -89,14 +90,49 @@ RECALC=FALSE
 
 
 if(RECALC) source("regenerate_data.R") # This code cannot be reproduced without access to the underlying datasets
 if(RECALC) source("regenerate_data.R") # This code cannot be reproduced without access to the underlying datasets
 
 
+if(RECALC) source("create-sib-subdataset.R") #This code may not be reproducible in the future
+
 if(RECALC) source("create-all-icc.R") 
 if(RECALC) source("create-all-icc.R") 
 
 
 if(RECALC) source("simulate-r-for-icc.R") #when ran on Aug 2 2023, it gave an error chol(): decomposition failed -- perhaps one of our newly added datasets (lyon, quechua) is too small? -- happened again on Aug 15, need to double check how this affects simulation; I suspect this is bc overlap bet function names across this & previous code
 if(RECALC) source("simulate-r-for-icc.R") #when ran on Aug 2 2023, it gave an error chol(): decomposition failed -- perhaps one of our newly added datasets (lyon, quechua) is too small? -- happened again on Aug 15, need to double check how this affects simulation; I suspect this is bc overlap bet function names across this & previous code
 #aug 18, now it runs for ever...
 #aug 18, now it runs for ever...
+
+if(RECALC) source("create-all-rs.R")
+```
+
+
+## Read in all data
+
+```{r readin}
+
+df.icc.simu <- read.csv("../output/df.icc.simu.csv")
+
+mydat_aclew <- read.csv(paste0('../data_output/', 'aclew','_metrics_scaled.csv')) 
+mydat_aclew <- mydat_aclew[is.element(mydat_aclew$experiment, corpora),]
+
+mydat_lena <- read.csv(paste0('../data_output/', 'lena','_metrics_scaled.csv'))
+mydat_lena <- mydat_lena[is.element(mydat_lena$experiment, corpora),]
+
+all_rs <- read.csv("../data_output/all_rs.csv")
+
+df.icc.mixed<-read.csv("../output/df.icc.mixed.csv")
+df.icc.mixed$Type<-get_type(df.icc.mixed)
+
+
+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]"
+df.icc.age$age_bin<-factor(df.icc.age$age_bin,levels=age_levels)
+df.icc.age$Type<-get_type(df.icc.age)
+
+df.icc.corpus<-read.csv("../output/df.icc.corpus.csv")
+df.icc.corpus$Type <- get_type(df.icc.corpus)
+
 ```
 ```
 
 
 
 
-## Simulation to better understand ICC
+
+## SM A: Simulation to better understand ICC
 
 
 We were uncertain of how to interpret ICC's numeric values. It is described as "proportion of variance explained", but we do not know if it should be considered as a percentage (like R^2) or a correlation (like r). We therefore simulated data controlling the underlying r between paired datapoints to see how ICC recovered that underlying r.
 We were uncertain of how to interpret ICC's numeric values. It is described as "proportion of variance explained", but we do not know if it should be considered as a percentage (like R^2) or a correlation (like r). We therefore simulated data controlling the underlying r between paired datapoints to see how ICC recovered that underlying r.
 
 
@@ -117,14 +153,13 @@ We use simstudy, a package created for such simulations, following the vignette
 
 
 In the following plot, 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. 
 In the following plot, 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}
-read.csv("../output/df.icc.simu.csv")->df.icc.mixed
+```{r icc-sim-plot}
 
 
-plot(df.icc.mixed$icc_child_id~df.icc.mixed$myr,xlab="r used to simulate the data",ylab="Estimated ICC from simulated data")
+plot(df.icc.simu$icc_child_id~df.icc.simu$myr,xlab="r used to simulate the data",ylab="Estimated ICC from simulated data")
 
 
 ```
 ```
 
 
-## More information for benchmarking our results against previously reported reliability studies
+## SM B: More information for benchmarking our results against previously reported reliability studies
 
 
 First, we looked for measures of language development used with observational data that can be employed with children aged 0-3 years, and which are available at least in English. All of the instruments we found rely on reports from caregivers, who are basing their judgments on their cumulative experience with the child (e.g., the Child Observation Record Advantage, Schweinhart, McNair, & Larner, 1993; the Desired Results Developmental Profile, REF; the MacArthur-Bates Communicative Development Inventory, REF). Readers are likely most familiar with the MB-CDI,  Fenson et al., 1994 report a correlation of r=.95 in their sample of North American, monolingual infants. We did not find a systematic review or meta-analysis providing more such estimates. However, @frank2021 analyzed data archived in a CDI repository, concentrating on American English and Norwegian, where longitudinal data was available. They found that for both datasets, correlations within 2-4 months were above r=.8, with correlations at 16 months of distance (i.e., a form filled in at 8 and 24 months) at their lowest, r=.5. These correlations are very high when considering that the CDI tends to have ceiling and floor effects at these extreme ages. Another report looked at correlations when parents completed two versions of the form in two media (e.g., short form in paper and long form online, or vice versa) within a month. Here, the correlation was r=.8 for comprehension and r=.6 for production. It is worth bearing in mind that test-retest reliability in parental report measures does not depend only on the consistency in the individual infants' ranking for a given behavior, but also on the consistency of the adult in reporting it. Moreover, they are based on cumulative experience, rather than a one-shot observation, as in the case of long-form recordings. Therefore, they do not constitute an appropriate comparison point, and by and large we can be quite certain that they will yield higher reliability than metrics based on the children themselves.  For example, a meta-analysis of infant laboratory tasks, including test-retest data for sound discrimination, word recognition, and prosodic processing, found that the meta-analytic weighted average was not different from zero, suggesting that performance in these short laboratory tasks may not be captured in a stable way across testing days. Thus, parental report (or short lab studies) may not be the most appropriate comparisons for our own study.
 First, we looked for measures of language development used with observational data that can be employed with children aged 0-3 years, and which are available at least in English. All of the instruments we found rely on reports from caregivers, who are basing their judgments on their cumulative experience with the child (e.g., the Child Observation Record Advantage, Schweinhart, McNair, & Larner, 1993; the Desired Results Developmental Profile, REF; the MacArthur-Bates Communicative Development Inventory, REF). Readers are likely most familiar with the MB-CDI,  Fenson et al., 1994 report a correlation of r=.95 in their sample of North American, monolingual infants. We did not find a systematic review or meta-analysis providing more such estimates. However, @frank2021 analyzed data archived in a CDI repository, concentrating on American English and Norwegian, where longitudinal data was available. They found that for both datasets, correlations within 2-4 months were above r=.8, with correlations at 16 months of distance (i.e., a form filled in at 8 and 24 months) at their lowest, r=.5. These correlations are very high when considering that the CDI tends to have ceiling and floor effects at these extreme ages. Another report looked at correlations when parents completed two versions of the form in two media (e.g., short form in paper and long form online, or vice versa) within a month. Here, the correlation was r=.8 for comprehension and r=.6 for production. It is worth bearing in mind that test-retest reliability in parental report measures does not depend only on the consistency in the individual infants' ranking for a given behavior, but also on the consistency of the adult in reporting it. Moreover, they are based on cumulative experience, rather than a one-shot observation, as in the case of long-form recordings. Therefore, they do not constitute an appropriate comparison point, and by and large we can be quite certain that they will yield higher reliability than metrics based on the children themselves.  For example, a meta-analysis of infant laboratory tasks, including test-retest data for sound discrimination, word recognition, and prosodic processing, found that the meta-analytic weighted average was not different from zero, suggesting that performance in these short laboratory tasks may not be captured in a stable way across testing days. Thus, parental report (or short lab studies) may not be the most appropriate comparisons for our own study.
 
 
@@ -135,34 +170,32 @@ For the other tests, reliability is mainly available from reports by the compani
 
 
 Many other standardized tests exist for children over three years of age. Given that most children included in the present study were under three, these other tests do not constitute an ideal comparison point. Nonetheless, in the spirit of informativeness, it is useful to consider that a systematic review and meta-analysis has been done looking at all psychometric properties (internal consistency, reliability, measurement error, content and structural validity, convergent and discriminant validity) for standardized assessments targeted at children aged 4-12 years (REF). Out of 76 assessments found in the literature, only 15 could be evaluated for their psychometric properties, and 14 reported on reliability based on independent evidence (i.e., the researchers tested and retested children, rather than relying on the company's report of reliability). Among these, correlations for test-retest reliability averaged r=.67, with a range from .35 to .76. The authors concluded that psychometric quality was limited for all assessments, but based on the available evidence, PLS-5 (whose test-retest reliability was r=.69) was among those recommended for use.
 Many other standardized tests exist for children over three years of age. Given that most children included in the present study were under three, these other tests do not constitute an ideal comparison point. Nonetheless, in the spirit of informativeness, it is useful to consider that a systematic review and meta-analysis has been done looking at all psychometric properties (internal consistency, reliability, measurement error, content and structural validity, convergent and discriminant validity) for standardized assessments targeted at children aged 4-12 years (REF). Out of 76 assessments found in the literature, only 15 could be evaluated for their psychometric properties, and 14 reported on reliability based on independent evidence (i.e., the researchers tested and retested children, rather than relying on the company's report of reliability). Among these, correlations for test-retest reliability averaged r=.67, with a range from .35 to .76. The authors concluded that psychometric quality was limited for all assessments, but based on the available evidence, PLS-5 (whose test-retest reliability was r=.69) was among those recommended for use.
 
 
-Third, and perhaps most relevant, we looked for references that evaluated the psychometric properties of measures extracted from wearable data. We found no previous work attempting to do so on the basis of completely ecological, unconstrained data like ours. The closest references we could find reported on reliability and/or validity of measurements from wearable data collected in constrained situations, such as having 4.5 year old children wear interior sensors and asking them to complete four tests of balance (e.g., standing with their eyes closed; Liu et al., 2022). It is likely that consistency and test-retest reliability are higher in such cases than in data like ours, making it hard to compare. Nonetheless, to give an idea, a recent meta-analysis of wea?read.tablerable inertial sensors in healthy adults found correlations between these instruments and gold standards above r= .88 for one set of measures (based on means) but much lower for another (based on variability, max weighted mean effect r = .58). Regarding test-retest reliability, the meta-analysts report ICCs above .6 for all measures for which they could find multiple studies reporting them. However, those authors point out that the majority of the included studies were classified as low quality, according to a standardized quality assessment for that work. 
+Third, and perhaps most relevant, we looked for references that evaluated the psychometric properties of measures extracted from wearable data. We found no previous work attempting to do so on the basis of completely ecological, unconstrained data like ours. The closest references we could find reported on reliability and/or validity of measurements from wearable data collected in constrained situations, such as having 4.5 year old children wear interior sensors and asking them to complete four tests of balance (e.g., standing with their eyes closed; Liu et al., 2022). It is likely that consistency and test-retest reliability are higher in such cases than in data like ours, making it hard to compare. Nonetheless, to give an idea, a recent meta-analysis of wearable inertial sensors in healthy adults found correlations between these instruments and gold standards above r= .88 for one set of measures (based on means) but much lower for another (based on variability, max weighted mean effect r = .58). Regarding test-retest reliability, the meta-analysts report ICCs above .6 for all measures for which they could find multiple studies reporting them. However, those authors point out that the majority of the included studies were classified as low quality, according to a standardized quality assessment for that work. 
 
 
 
 
 
 
-## Code to reproduce Table 2
+## SM C: Code to reproduce Table 2
 
 
 
 
 
 
 ```{r tab2}
 ```{r tab2}
-mydat <- read.csv(paste0('../data_output/', 'aclew','_metrics.csv'))
-
-child_per_corpus= aggregate(data = mydat, child_id ~ experiment, function(child_id) length(unique(child_id)))[,2]
+child_per_corpus= aggregate(data = mydat_aclew, child_id ~ experiment, function(child_id) length(unique(child_id)))[,2]
 
 
-rec_per_corpus = aggregate(data = mydat, session_id ~ experiment, function(session_id) length(unique(session_id)))[,2]
+rec_per_corpus = aggregate(data = mydat_aclew, session_id ~ experiment, function(session_id) length(unique(session_id)))[,2]
 
 
-rec_per_child = setNames(aggregate(data = mydat, session_id ~ experiment*child_id, function(session_id) length(unique(session_id))), c('experiment', 'Chi', 'No_rec'))
+rec_per_child = setNames(aggregate(data = mydat_aclew, session_id ~ experiment*child_id, function(session_id) length(unique(session_id))), c('experiment', 'Chi', 'No_rec'))
 
 
 min_rec_per_child = aggregate(data = rec_per_child, No_rec ~ experiment, min)[,2]
 min_rec_per_child = aggregate(data = rec_per_child, No_rec ~ experiment, min)[,2]
 max_rec_per_child = aggregate(data = rec_per_child, No_rec ~ experiment, max)[,2]
 max_rec_per_child = aggregate(data = rec_per_child, No_rec ~ experiment, max)[,2]
 rec_r_per_child = paste(min_rec_per_child,max_rec_per_child,sep="-")
 rec_r_per_child = paste(min_rec_per_child,max_rec_per_child,sep="-")
 
 
-dur_per_corpus = aggregate(data = mydat, duration_vtc ~ experiment, function(duration_vtc) round(mean(duration_vtc)/3.6e+6,1))[,2]
+dur_per_corpus = aggregate(data = mydat_aclew, duration_vtc ~ experiment, function(duration_vtc) round(mean(duration_vtc)/3.6e+6,1))[,2]
 
 
-age_mean_per_corpus = aggregate(data = mydat, age ~ experiment, function(age) round(mean(age),1))[,2]
+age_mean_per_corpus = aggregate(data = mydat_aclew, age ~ experiment, function(age) round(mean(age),1))[,2]
 
 
-age_min_per_corpus = aggregate(data = mydat, age ~ experiment, function(age) min(age))[,2]
+age_min_per_corpus = aggregate(data = mydat_aclew, age ~ experiment, function(age) min(age))[,2]
 
 
-age_max_per_corpus = aggregate(data = mydat, age ~ experiment, function(age) max(age))[,2]
+age_max_per_corpus = aggregate(data = mydat_aclew, age ~ experiment, function(age) max(age))[,2]
 
 
 age_r_per_corpus = paste(age_min_per_corpus,age_max_per_corpus,sep="-")
 age_r_per_corpus = paste(age_min_per_corpus,age_max_per_corpus,sep="-")
 
 
@@ -171,33 +204,26 @@ age_r_per_corpus = paste(age_min_per_corpus,age_max_per_corpus,sep="-")
 experiments=c("bergelson", "cougar", "fausey-trio", "lucid","lyon", "quechua",  "warlaumont", "winnipeg")
 experiments=c("bergelson", "cougar", "fausey-trio", "lucid","lyon", "quechua",  "warlaumont", "winnipeg")
 locations=c("Northeast US", "Northwest US", "Western US", "Northwest England", "Central France", "Highlands Bolivia", "Western US", "Western Canada")
 locations=c("Northeast US", "Northwest US", "Western US", "Northwest England", "Central France", "Highlands Bolivia", "Western US", "Western Canada")
 
 
-  corpus_description=cbind(experiments,child_per_corpus, rec_r_per_child, rec_per_corpus, dur_per_corpus, age_mean_per_corpus,age_r_per_corpus)
-
+corpus_description=cbind(experiments,child_per_corpus, rec_r_per_child, rec_per_corpus, dur_per_corpus, age_mean_per_corpus,age_r_per_corpus)
 
 
 write.table(corpus_description, "../output/corpus_description.csv", sep='\t')
 write.table(corpus_description, "../output/corpus_description.csv", sep='\t')
 
 
-
-nkids=length(levels(factor(paste(mydat$experiment,mydat$child_id))))
-nrecs=length(levels(factor(paste(mydat$experiment,mydat$session_id))))
+nkids=length(levels(mydat_aclew$child_id))
+nrecs=length(levels(mydat_aclew$session_id))
 ```
 ```
 
 
-## Code to reproduce Fig. 2
+## SM D: Code to reproduce Fig. 2
 
 
 ```{r icc-examples-fig2, echo=F,fig.width=4, fig.height=3,fig.cap="(A) scatterplot for one variable with relatively low ICCs versus (B) one with relatively higher ICCs (see Tables 1-2 for details)"}
 ```{r icc-examples-fig2, echo=F,fig.width=4, fig.height=3,fig.cap="(A) scatterplot for one variable with relatively low ICCs versus (B) one with relatively higher ICCs (see Tables 1-2 for details)"}
 # 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
 # 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
-data_set="lena"
-#mydat <- read.csv(paste0('../data_output/', data_set,'_metrics.csv'))
-mydat <- read.csv(paste0('../data_output/', data_set,'_metrics_scaled.csv'))
-mydat <- mydat[is.element(mydat$experiment, corpora),]
-
 
 
 # remove missing data points altogether
 # remove missing data points altogether
-mydat <- mydat[!is.na(mydat$peak_wc_adu_ph) & !is.na(mydat$voc_dur_och_ph),]
+mydat_lena_nomissing <- mydat_lena[!is.na(mydat_lena$peak_wc_adu_ph) & !is.na(mydat_lena$voc_dur_och_ph),]
 
 
 #sample down to get 2 recs per child
 #sample down to get 2 recs per child
 mysample = NULL
 mysample = NULL
-for(thischild in levels(as.factor(mydat$child_id))){
-  onechidat <- mydat[mydat$child_id == thischild,c("child_id","experiment","age","child_id","peak_wc_adu_ph","voc_dur_och_ph")]
+for(thischild in levels(as.factor(mydat_lena_nomissing$child_id))){
+  onechidat <- mydat_lena_nomissing[mydat_lena_nomissing$child_id == thischild,c("child_id","experiment","age","child_id","peak_wc_adu_ph","voc_dur_och_ph")]
   
   
   if(dim(onechidat)[1]>=2){
   if(dim(onechidat)[1]>=2){
     selrows=sample(1:dim(onechidat)[1],2)
     selrows=sample(1:dim(onechidat)[1],2)
@@ -258,103 +284,127 @@ ggarrange(bad, good,
 
 
 ```
 ```
 
 
+## SM E: Code to reproduce text at the beginning of the "Setting the stage" section
 
 
-## Code to reproduce other text in the section Results, subsection Overall reliability
+```{r gen-table}
 
 
-```{r readin}
-df.icc.mixed<-read.csv("../output/df.icc.mixed.csv")
+#summary(all_rs)
+rval_tab=cbind(apply(all_rs[,1:20],1,mean),apply(all_rs[,1:20],1,sd),all_rs[,c("data_set","metric")])
+colnames(rval_tab) <-c("m","sd","data_set","metric") 
+rval_tab[,1:2]=round(rval_tab[,1:2],2)
 
 
-#df.icc.mixed[df.icc.mixed$formula=="no_exp",c("data_set","metric")]
+rval_tab$fin<-paste0(rval_tab$m," ","[",rval_tab$m-2*rval_tab$sd,",",rval_tab$m+2*rval_tab$sd,"]")
 
 
-df.icc.mixed$Type<-get_type(df.icc.mixed)
+mytab=rbind(cbind(rval_tab[rval_tab$data_set=="aclew" & rval_tab$metric== "wc_adu_ph","fin"],rval_tab[rval_tab$data_set=="lena" & rval_tab$metric== "wc_adu_ph","fin"]),
+            cbind(rval_tab[rval_tab$metric== "can_voc_chi_ph","fin"],rval_tab[rval_tab$metric== "lena_CVC_ph","fin"]),
+            cbind(rval_tab[rval_tab$metric== "simple_CTC_ph","fin"],rval_tab[rval_tab$metric== "lena_CTC_ph","fin"]),
+            cbind(rval_tab[rval_tab$data_set=="aclew" & rval_tab$metric== "voc_chi_ph","fin"],rval_tab[rval_tab$data_set=="lena" & rval_tab$metric== "voc_chi_ph","fin"])
+       )
+mytab=gsub("0.",".",mytab,fixed=T)
+colnames(mytab)<-c("aclew","lena")
+rownames(mytab)<-c("AWC","CVC","CTC","Chi vocs")
+print(mytab)
 
 
+rval_tab$Type<-get_type(rval_tab)
 
 
 ```
 ```
 
 
-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. 
+Out of our `r length(levels(factor(mydat_aclew$experiment)))` corpora and `r length(levels(factor(mydat_aclew$child_id)))` children, `r length(levels(factor(dist_contig_lena$child_id)))` children (belonging to `r length(levels(factor(gsub(" .*","",dist_contig_lena$child_id))))`  corpora) could be included in this analysis, as some children did not have recordings less than two months apart (in particular, no child from the Warlaumont corpus did). 
 
 
+## SM F: Exploration: Is lower Child ICC than correlations due to the fact that the overall Child ICC includes data more than 1 month away? THIS ONE NEEDS WORK
 
 
+```{r}
+rval_tab$id=paste(rval_tab$data_set,rval_tab$metric)
+df.icc.mixed$id=paste(df.icc.mixed$data_set,df.icc.mixed$metric)
+r_icc=merge(rval_tab,df.icc.mixed,by="id")
 
 
-## Code to reproduce Fig. 3
+```
 
 
-```{r icc-allexp-fig3, echo=F,fig.width=4, fig.height=3,fig.cap="Distribution of ICC attributed to corpus (a) and children (b), when combining data from all corpora."}
 
 
+## SM G: Code to reproduce Figure 3
 
 
+```{r r-fig3, echo=F,fig.width=4, fig.height=3,fig.cap="Distribution of correlation coefficients."}
 
 
-ggplot(df.icc.mixed, aes(y = icc_child_id, x = toupper(data_set))) +
+
+ggplot(rval_tab, aes(y = m, x = toupper(p))) +
   geom_violin(alpha = 0.5) +
   geom_violin(alpha = 0.5) +
   geom_quasirandom(aes(colour = Type,shape = Type)) +  
   geom_quasirandom(aes(colour = Type,shape = Type)) +  
-  labs( y = "ICC child ID",x="Pipeline") +  theme(text = element_text(size = 20)) + 
-  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")) 
+  theme() +labs( y = "r",x="Pipeline")
+
 
 
 ```
 ```
 
 
+## SM H: Code to reproduce text under Figure 3
+
+```{r reg model cor}
+
+
+lr_cor <- lm(m ~ Type * p, data=rval_tab) 
+#plot(lr_cor)
+#binomial could be used, but diagnostic plots look great
+
+reg_sum_cor=summary(lr_cor)
+
+reg_anova_cor=Anova(lr_icc_chi)
+
+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)
+
+```
+
+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. 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"]`). See below for fuller results.
+
+```{r print out anova results rec on cor}
+
+kable(round(reg_anova_cor,2))
+```
+
+
+## SM I: Code to reproduce text at the beginning of the "Overall reliability" section
+
+
+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 best_metric}
 
 
-## Code to reproduce text under Figure 3
+ismax = aggregate(df.icc.mixed$icc_child_id,by=list(df.icc.mixed$Type),max)
+best_metric<-df.icc.mixed[df.icc.mixed$icc_child_id%in%ismax$x,c("metric","data_set","icc_child_id","Type")]
+best_metric$icc_child_id=round(best_metric$icc_child_id,2)
 
 
+```
 
 
 
 
-The majority of measures had ICCs between .3 and .5. `r sum(df.icc.mixed$icc_child_id > .5)` measures had higher ICCs, and surprisingly, `r sum(df.icc.mixed$icc_child_id[grep("och",df.icc.mixed$metric)] > .5)` of them corresponded to the "other child" category, known to have the worst accuracy according to previous analyses (Cristia et al., 2020). 
+Figure 3 shows the distribution of Child ICC across all 69 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 the SM, 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). 
 
 
-### Checking whether high ICC for other child measures are due to number of siblings
+## SM J: Exploration: Are high Child ICCs for "other child" measures due to number or presence of siblings?
 
 
 ```{r explo-och-sibn}
 ```{r explo-och-sibn}
 
 
-#df.icc.mixed[df.icc.mixed$icc_child_id>.5,c("data_set","metric")]
-#df.icc.mixed[df.icc.mixed$icc_child_id>.5,c("data_set","metric","icc_child_id")]
-
-myaclewdat <- read.csv(paste0('../data_output/', "aclew",'_metrics_scaled.csv'))
-myaclewdat <- myaclewdat[is.element(myaclewdat$experiment, corpora),]
-
-read.csv("../input/aclew_md.csv")->x
-x$labname[x$labname=="ROW"]<-"luc"
-x$labname[x$labname=="SOD"]<-"win"
-x$ch_id=paste(tolower(x$labname),as.character(x$child_level_id))
-x$n_of_siblings<-x$number_older_sibs
-
-x$ch_id[x$labname %in% c("BER")] = paste(tolower(x$labname[x$labname %in% c("BER")]),as.numeric(as.character(x$child_level_id[x$labname %in% c("BER")])))
-x=x[!duplicated(x$ch_id),]
-
-myaclewdat$lab=substr(myaclewdat$experiment,1,3)
-myaclewdat$ch_id=paste(myaclewdat$lab,gsub(".* ","",myaclewdat$child_id))
-myaclewdat$ch_id[myaclewdat$experiment=="warlaumont"]=gsub(" 0"," ",myaclewdat$ch_id[myaclewdat$experiment=="warlaumont"])
-myaclewdat$ch_id[myaclewdat$experiment=="winnipeg"]=gsub(" C"," CW",myaclewdat$ch_id[myaclewdat$experiment=="winnipeg"])
-
-#sort(factor(myaclewdat$ch_id[myaclewdat$experiment=="winnipeg"]))
-#sort(x$ch_id[x$lab=="win"])
-#sum(myaclewdat$ch_id %in% x$ch_id)
-#sum(x$ch_id %in% myaclewdat$ch_id)
-
-metadata=x[,c("ch_id","n_of_siblings")]
-read.csv("../input/quechua_md.csv")->x 
-x$ch_id=paste("que",x$child_id)
-metadata=rbind(metadata,x[,c("ch_id","n_of_siblings")])
-mydat2=merge(myaclewdat,metadata,all.x=T,by="ch_id")
-#table(mydat2$n_of_siblings,mydat2$experiment)
-has_n_of_sib=table(mydat2$experiment,!is.na(mydat2$n_of_siblings))
-corp_w_sib=levels(factor(mydat2$experiment[!is.na(mydat2$n_of_siblings)]))
-corp_w_sib_clean=corp_w_sib[1]
-for(i in 2:length(corp_w_sib)) corp_w_sib_clean=paste(corp_w_sib_clean,corp_w_sib[i],sep=", ")
-  
-model<-lmer(voc_dur_och_ph~ age_s +n_of_siblings  + (1|experiment/child_id),data=mydat2)
+
+model<-lmer(voc_dur_och_ph~ age_s + n_of_siblings  + (1|experiment/child_id),data=mydat2)
 
 
 #is sing
 #is sing
-model<-lmer(voc_dur_och_ph~ age_s +n_of_siblings  + (1|child_id),data=mydat2)
+model<-lmer(voc_dur_och_ph~ age_s + n_of_siblings  + (1|child_id),data=mydat2)
 icc.result.split<- t(as.data.frame(icc(model, by_group=TRUE))$ICC)
 icc.result.split<- t(as.data.frame(icc(model, by_group=TRUE))$ICC)
 #names(icc.result.split)=c("icc_child_id", "icc_corpus")
 #names(icc.result.split)=c("icc_child_id", "icc_corpus")
 names(icc.result.split)=c("icc_child_id")
 names(icc.result.split)=c("icc_child_id")
 
 
+
+has_n_of_sib=table(mydat2$experiment,!is.na(mydat2$n_of_siblings))
+corp_w_sib=levels(factor(mydat2$experiment[!is.na(mydat2$n_of_siblings)]))
+corp_w_sib_clean=corp_w_sib[1]
+for(i in 2:length(corp_w_sib)) corp_w_sib_clean=paste(corp_w_sib_clean,corp_w_sib[i],sep=", ")
+
+
 ```
 ```
 
 
 
 
-We reasoned this may be because children in our corpora vary in terms of the number of siblings they have, that siblings' presence may be stable across recordings, and that a greater number of siblings would lead to more other child vocalizations. As a result, any measure based on other child vocalizations would result in stable relative ranking of children due to the number of siblings present. To test this hypothesis, we selected the metric with the highest Child ICC, namely ACLEW's total vocalization duration by other children. We fit the full model again to predict this metric, but this time, in addition to controlling for age, we included sibling number as a fixed effect $lmer(metric~ age + sibling_number + (1|corpus/child))$, so that individual variation that was actually due to sibling number was captured by that fixed effect instead of the random effect for child. We had sibling number data for `r sum(has_n_of_sib[,"TRUE"])` recordings from `r length(levels(factor(mydat2$child_id[!is.na(mydat2$n_of_siblings)])))` in `r length(levels(factor(mydat2$experiment[!is.na(mydat2$n_of_siblings)])))` corpora (`r corp_w_sib_clean`). The number of siblings varied from `r min(mydat2$n_of_siblings,na.rm=T)` to `r max(mydat2$n_of_siblings,na.rm=T)`, with a mean of `r round(mean(mydat2$n_of_siblings,na.rm=T),1)` and a median of `r round(median(mydat2$n_of_siblings,na.rm=T),1)`.  Results indicated the full model was singular, so we fitted a No Corpus model to be able to extract a Child ICC. As a sanity check, we verified that the number of siblings predicted the outcome, total vocalization duration by other children -- and found that it did: ß = `r round(summary(model)$coefficients["n_of_siblings","Estimate"],2)`, t = `r round(summary(model)$coefficients["n_of_siblings","t value"],2)`, p < .001. This effect is relatively small: It means that per additional sibling, there is a .2 standard deviation increase in this variable. Turning now to how much variance is allocated to the random factor of Child, there was no difference in Child ICC 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)`) versus this re-analysis including the number of siblings (`r round(icc.result.split["icc_child_id"],2)`).
+We reasoned the high Child ICC for metrics related to other children may be because children in our corpora vary in terms of the number of siblings they have, that siblings' presence may be stable across recordings, and that a greater number of siblings would lead to more other child vocalizations. As a result, any measure based on other child vocalizations would result in stable relative ranking of children due to the number of siblings present. To test this hypothesis, we selected the metric with the highest Child ICC, namely ACLEW's total vocalization duration by other children. We fit the full model again to predict this metric, but this time, in addition to controlling for age, we included sibling number as a fixed effect $lmer(metric~ age + sibling_number + (1|corpus/child))$, so that individual variation that was actually due to sibling number was captured by that fixed effect instead of the random effect for child. We had sibling number data for `r sum(has_n_of_sib[,"TRUE"])` recordings from `r length(levels(factor(mydat2$child_id[!is.na(mydat2$n_of_siblings)])))` in `r length(levels(factor(mydat2$experiment[!is.na(mydat2$n_of_siblings)])))` corpora (`r corp_w_sib_clean`). The number of siblings varied from `r min(mydat2$n_of_siblings,na.rm=T)` to `r max(mydat2$n_of_siblings,na.rm=T)`, with a mean of `r round(mean(mydat2$n_of_siblings,na.rm=T),1)` and a median of `r round(median(mydat2$n_of_siblings,na.rm=T),1)`.  Results indicated the full model was singular, so we fitted a No Corpus model to be able to extract a Child ICC. As a sanity check, we verified that the number of siblings predicted the outcome, total vocalization duration by other children -- and found that it did: ß = `r round(summary(model)$coefficients["n_of_siblings","Estimate"],2)`, t = `r round(summary(model)$coefficients["n_of_siblings","t value"],2)`, p < .001. This effect is relatively small: It means that per additional sibling, there is a .2 standard deviation increase in this variable. Turning now to how much variance is allocated to the random factor of Child, there was no difference in Child ICC 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)`) versus this re-analysis including the number of siblings (`r round(icc.result.split["icc_child_id"],2)`).
 
 
-### Checking whether high ICC for other child measures are due to presence of siblings
 
 
 ```{r sib-presence}
 ```{r sib-presence}
-mydat2$sib_presence=ifelse(mydat2$n_of_siblings!=0,"present","absent")
 model_sib_presence<-lmer(voc_dur_och_ph~ age_s + sib_presence  + (1|experiment/child_id),data=mydat2)
 model_sib_presence<-lmer(voc_dur_och_ph~ age_s + sib_presence  + (1|experiment/child_id),data=mydat2)
 
 
 #is sing
 #is sing
@@ -367,10 +417,49 @@ names(icc.result.split)=c("icc_child_id")
 ```
 ```
 
 
 
 
-Perhaps it is not so much the sheer number of siblings that explains variance, but the sheer presence versus absence. After all, we can imagine that the effect of the number of siblings is not monotonic. We therefore repeated the analysis above but rather than adding the actual number of siblings, we had a binary variable that was "present" if the child had any siblings, and "absent" otherwise. 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)`).
+Perhaps it is not so much the sheer number of siblings that explains variance, but the sheer presence versus absence. After all, we can imagine that the effect of the number of siblings is not monotonic. We therefore repeated the analysis above but rather than adding the actual number of siblings, we had a binary variable that was "present" if the child had any siblings, and "absent" otherwise. 
+
+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 K: Exploration: are "bad" output measures those coming from VCM?
+
+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.
+
+```{r}
+vcm_type<-rep("Other ACLEW",dim(df.icc.mixed)[1])
+vcm_type[df.icc.mixed$data_set=="lena"]<-"LENA"
+vcm_type[grep("lp",df.icc.mixed$metric)]<-"ACLEW VCM"
+vcm_type[grep("cp",df.icc.mixed$metric)]<-"ACLEW VCM"
+vcm_type[grep("can",df.icc.mixed$metric)]<-"ACLEW VCM"
+vcm_type[grep("cry",df.icc.mixed$metric)]<-"ACLEW VCM"
+#cbind(df.icc.mixed[,c("metric","data_set","Type")],vcm_type)
+
+ggplot(df.icc.mixed, aes(y = icc_child_id, x = vcm_type)) +
+  geom_violin(alpha = 0.5) +
+  geom_quasirandom(aes(colour = Type,shape = Type)) +  
+  labs( y = "Child ICC",x="Type") +  theme(text = element_text(size = 20)) + 
+  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")) 
+
+```
+
+## SM L: Code to reproduce Figure 4
+
+```{r icc-allexp-fig4, echo=F,fig.width=4, fig.height=3,fig.cap="Distribution of ICC attributed to corpus (a) and children (b), when combining data from all corpora."}
 
 
 
 
-## Code to reproduce text before Table 3
+ggplot(df.icc.mixed, aes(y = icc_child_id, x = toupper(data_set))) +
+  geom_violin(alpha = 0.5) +
+  geom_quasirandom(aes(colour = Type,shape = Type)) +  
+  labs( y = "Child ICC",x="Pipeline") +  theme(text = element_text(size = 20)) + 
+  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")) 
+
+```
+
+
+## SM M: Code to reproduce text below Figure 4
 
 
 ```{r reg model icc}
 ```{r reg model icc}
 
 
@@ -386,25 +475,28 @@ msds = aggregate(df.icc.mixed$icc_child_id,by=list(df.icc.mixed$Type),get_msd)
 msds$x=gsub("0.",".",msds$x,fixed=T)
 msds$x=gsub("0.",".",msds$x,fixed=T)
 rownames(msds)<-msds$Group.1
 rownames(msds)<-msds$Group.1
 
 
-```
+msds_p = aggregate(df.icc.mixed$icc_child_id,by=list(df.icc.mixed$data_set),get_msd)
+msds_p$x=gsub("0.",".",msds_p$x,fixed=T)
+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. 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 signficant predictor (F(`r reg_anova["Type","Df"]`) = `r round(reg_anova["Type","F value"],1)`, p<.001), whereas 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"]`).
 
 
+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. 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 signficant predictor (F(`r reg_anova["Type","Df"]`) = `r round(reg_anova["Type","F value"],1)`, p<.001), whereas 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"]`). 
 
 
 
 
-## Code to reproduce Table 3
+## SM N: Code to reproduce Table 4
 
 
 
 
 ```{r tab3, results="as.is"}
 ```{r tab3, results="as.is"}
-key_metrics = c("wc_adu_ph", "lena_CVC", "lena_CTC",  "voc_fem_ph",  "voc_chi_ph")
+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")] ,
 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")],
            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)
            by='metric', all=TRUE)
 colnames(x) <- c("metric", "LENA ICC", "ACLEW ICC")
 colnames(x) <- c("metric", "LENA ICC", "ACLEW ICC")
 rownames(x)<-x$metric
 rownames(x)<-x$metric
-x["lena_CTC","ACLEW ICC"]<-df.icc.mixed[df.icc.mixed$metric=="simple_CTC","icc_child_id"]
-x["lena_CVC","ACLEW ICC"]<-df.icc.mixed[df.icc.mixed$metric=="can_voc_chi_ph","icc_child_id"]
+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[,2:3]=round(x[,2:3],2)
 x=x[key_metrics,]
 x=x[key_metrics,]
 
 
@@ -412,217 +504,123 @@ kable(x,row.names = F,digits=2,caption="Most commonly used metrics.")
 #x
 #x
 ```
 ```
 
 
-## Code to reproduce "Exploratory analyses: Correlations based on paired analyses of recordings done within two months"
-
-
-```{r compute correlation analysis for close recs, warning = F, echo=FALSE}
-#to compare with Gilkerson, we just need to focus on AWC, CVC, CTC (in LENA, but for comparison purposes, we also include aclew)
-
 
 
-mydat_lena <- read.csv(paste0('../data_output/', "lena",'_metrics_scaled.csv'))
-#table(mydat_lena$session_id)[table(mydat_lena$session_id)>1]
-mydat_lena=mydat_lena[order(mydat_lena$experiment,mydat_lena$child_id,mydat_lena$age),]
-# dim(mydat_lena) #1253 obs 
-key=mydat_lena[,c("experiment","child_id","age")]
 
 
-dist_contig_lena <- define_contiguous(mydat_lena)
-# dim(dist_contig_lena) #684
-# table(dist_contig_lena$session_id)[table(dist_contig_lena$session_id)>1] #0=no repeats
-mydat_lena = merge(mydat_lena,dist_contig_lena[,c("session_id","next_session")],by="session_id", all.x=T) #note that we need to do all.x=T, bc we need to keep others that are next session
+## SM O: Code to reproduce text at the beginning of the "Reliability across age groups" section
 
 
+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.
 
 
-#table(dist_contig_lena$experiment) #this is the number of eligible recordings per corpus
-
-#table(dist_contig_lena$experiment[!duplicated(dist_contig_lena$child_id)])#this is the number of eligible children per corpus
-#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 10 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),]
-#dim(mydat_aclew)
-# dim(dist_contig_aclew) #686 -- for some reason, we have 2 more eligible recs here... not sure why
-#length(dist_contig_aclew$session_id[!(dist_contig_aclew$session_id %in% dist_contig_lena$session_id)])  # in fact, we have lots of sessions not in common!
-#length(dist_contig_lena$session_id[!(dist_contig_lena$session_id %in% dist_contig_aclew$session_id)])
-# they are present in aclew but not in lena
-# NOTE: I have "winnipeg C175 C175_20151201" "winnipeg C175 C175_20160301" for lena but not aclew; and i have "fausey-trio T066 T066/T066_000700"   "quechua 1096 20190630_190025_009107" "quechua 1096 20190702_193551_008712" 
-
-#one thing that drove me crazy was that, probably because of the small differences in inclusion (2 recs in aclew & lena respectively), I was ending up with different lists of pairings across aclew & lena. So to simplify, I'll impose the same pairing across both, which involves losing a couple of additional recs in lena
-xxx=mydat_aclew[mydat_aclew$session_id %in% mydat_lena$session_id,]
-rownames(xxx)<-xxx$session_id
-xxx=xxx[mydat_lena$session_id,]
-
-dist_contig_aclew <- define_contiguous(xxx) 
-mydat_aclew = merge(mydat_aclew,dist_contig_aclew[,c("session_id","next_session")],by="session_id", all.x=T)
-
-# dist_contig_lena=dist_contig_lena[((dist_contig_lena$session_id %in% dist_contig_aclew$session_id) & (dist_contig_lena$next_session %in% dist_contig_aclew$next_session)),]
-# dist_contig_lena=dist_contig_lena[order(dist_contig_lena$session_id),]
-# 
-# dist_contig_aclew=dist_contig_aclew[((dist_contig_aclew$session_id %in% dist_contig_lena$session_id) & (dist_contig_aclew$next_session %in% dist_contig_aclew$next_session)),]
-# dist_contig_aclew=dist_contig_aclew[order(dist_contig_aclew$session_id),]
-
+## SM P: Code to reproduce Figure 5
 
 
-nsamples=20
 
 
-all_rs=data.frame(matrix(NA,nrow=dim(df.icc.mixed)[1],ncol=(nsamples)))
-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
+```{r relBYage-fig5, echo=F,fig.width=6, fig.height=10,fig.cap="Distribution of ICC attributed to corpus (a) and children (b), when binning children's age."}
 
 
-for(i in 1:nsamples){#i=1
-  
-    #for each child, sample 2 contiguous recordings that are less than 2 months away
-    #step 1: sample one session per child among the list of sessions that are close by
-      #we use the lena one because there is no difference across lena & aclew in terms of which kids have which sessions, since in this paper all recs have both lena and aclew, so it's just a question of using one of them
-    close_sessions <- dist_contig_lena  %>%
-    group_by(child_id)%>%
-    slice_sample(n = 1) 
-  #table(close_sessions$experiment) #these have to be similar
-    #dim(close_sessions)
-  
-  for(j in 1:dim(df.icc.mixed)[1]){# j=1
-    data_set=df.icc.mixed[j,"data_set"]
-    metric=df.icc.mixed[j,"metric"]
-    
-    if(data_set=="aclew") dat_for_cor<-mydat_aclew else  dat_for_cor<-mydat_lena
-
-    #step 2: get data from those sampled sessions as rec1
-    rec1 = subset(dat_for_cor,session_id %in% close_sessions$session_id)  
-    #step 3: get the next session
-    rec2 = subset(dat_for_cor,session_id %in% close_sessions$next_session)   
-
-     all_rs[all_rs$data_set==data_set & all_rs$metric==metric,i]<-
-      cor.test(rec1[,metric],rec2[,metric])$estimate
-    
+#this complicated section is just to add N of participants in each facet, we first estimate it:
+facet_labels_chi=facet_labels_cor=NULL
+for(thisage in levels(df.icc.age$age_bin)){#thisage="(0,6]"
+  facet_labels_cor = c(facet_labels_cor,paste0("N cor=",min(df.icc.age$ncor[df.icc.age$age_bin==thisage],na.rm=T))) #checked: there is no variation across metrics in n of corpora included
+    if(min(df.icc.age$nchi[df.icc.age$age_bin==thisage],na.rm=T) !=max(df.icc.age$nchi[df.icc.age$age_bin==thisage],na.rm=T)){
+    facet_labels_chi = c(facet_labels_chi,paste0("N chi=",paste(range(df.icc.age$nchi[df.icc.age$age_bin==thisage],na.rm=T),collapse="-"))) 
+  } else {
+    facet_labels_chi = c(facet_labels_chi,paste0("N chi=",min(df.icc.age$nchi[df.icc.age$age_bin==thisage],na.rm=T))) 
   }
   }
 }
 }
 
 
+#and then we structure it so that it goes on the plot
+f_labels<-data.frame(age_bin=levels(df.icc.age$age_bin),facet_labels_chi=facet_labels_chi,facet_labels_cor=facet_labels_cor)
 
 
+f_labels$age_bin<-factor(f_labels$age_bin,levels=age_levels)
+
+ggplot(df.icc.age, aes(y = icc_child_id, x = toupper(data_set))) +
+  geom_violin(alpha = 0.5) +
+  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)
 
 
 ```
 ```
 
 
-```{r}
+## SM Q: Code to reproduce text below Figure 5
 
 
+```{r reg model age}
 
 
-#summary(all_rs)
-rval_tab=cbind(apply(all_rs[,1:20],1,mean),apply(all_rs[,1:20],1,sd),all_rs[,21:22])
-colnames(rval_tab) <-c("m","sd","p","met") 
-rval_tab[,1:2]=round(rval_tab[,1:2],2)
 
 
-rval_tab$fin<-paste0(rval_tab$m," ","[",rval_tab$m-2*rval_tab$sd,",",rval_tab$m+2*rval_tab$sd,"]")
+age_icc <- lm(icc_child_id ~ Type * data_set * age_bin, data=df.icc.age) 
+#plot(age_icc)
+#binomial could be used,  diagnostic plots look good
 
 
-mytab=rbind(cbind(rval_tab[rval_tab$p=="aclew" & rval_tab$met== "wc_adu_ph","fin"],rval_tab[rval_tab$p=="lena" & rval_tab$met== "wc_adu_ph","fin"]),
-            cbind(rval_tab[rval_tab$met== "can_voc_chi_ph","fin"],rval_tab[rval_tab$met== "lena_CVC","fin"]),
-            cbind(rval_tab[rval_tab$met== "simple_CTC","fin"],rval_tab[rval_tab$met== "lena_CTC","fin"]),
-            cbind(rval_tab[rval_tab$p=="aclew" & rval_tab$met== "voc_chi_ph","fin"],rval_tab[rval_tab$p=="lena" & rval_tab$met== "voc_chi_ph","fin"])
-       )
-mytab=gsub("0.",".",mytab,fixed=T)
-colnames(mytab)<-c("aclew","lena")
-rownames(mytab)<-c("AWC","CVC","CTC","Chi vocs")
-print(mytab)
+reg_sum_age_icc=summary(age_icc)
 
 
-rval_tab$Type<-get_type(rval_tab)
+reg_anova_age_icc=Anova(age_icc)
 
 
 ```
 ```
 
 
-Out of our `r length(levels(factor(mydat_aclew$experiment)))` corpora and `r length(levels(factor(mydat_aclew$child_id)))` children, `r length(levels(factor(dist_contig_lena$child_id)))` children (belonging to `r length(levels(factor(gsub(" .*","",dist_contig_lena$child_id))))`  corpora) could be included in this analysis, as some children did not have recordings less than two months apart (in particular, no child from the Warlaumont corpus did). 
-
-## Code to reproduce Fig. 4
-
-```{r r-fig4, echo=F,fig.width=4, fig.height=3,fig.cap="Distribution of correlation coefficients."}
+As we did in the previous section for corpus, we checked whether Child ICC differed by talker types and pipelines across age bins by fitting a linear model with the formula $lm(Child_ICC ~ type * pipeline * age_bin)$. We found an adjusted R-squared of `r round(reg_sum_age_icc$adj.r.squared*100)`%, suggesting this model explained about a third of the variance in Child ICC.  A Type 3 ANOVA on this model revealed type was a signficant predictor (F(`r reg_anova["Type","Df"]`) = `r round(reg_anova["Type","F value"],1)`, p<.001), whereas 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. See below for more information.
 
 
 
 
-ggplot(rval_tab, aes(y = m, x = toupper(p))) +
-  geom_violin(alpha = 0.5) +
-  geom_quasirandom(aes(colour = Type,shape = Type)) +  
-  theme() +labs( y = "r",x="Pipeline")
-
+```{r print out anova results rec on icc by age}
+kable(round(reg_anova_age_icc,2))
 
 
 ```
 ```
 
 
-## Code to reproduce results of regression on correlation values
 
 
-```{r reg model cor}
 
 
 
 
-lr_cor <- lm(m ~ Type * p, data=rval_tab) 
-#plot(lr_cor)
-#binomial could be used, but diagnostic plots look great
+## SM R: Code to reproduce Figure 6
 
 
-reg_sum_cor=summary(lr_cor)
+```{r icc-bycor-fi68, echo=F,fig.width=4, fig.height=4,fig.cap="Correlations in Child ICC across corpora. Each point indicates the correlation in Child ICC for the corpus named in the x-axis with every other corpus."}
 
 
-reg_anova_cor=Anova(lr_icc_chi)
+r_X_age = NULL
 
 
-r_msds=aggregate(rval_tab$m,by=list(rval_tab$p),get_msd)
-rownames(r_msds)<-r_msds$Group.1
+for(ageA in levels(factor(df.icc.age$age_bin))){#ageA="(0,6]"
+  for(ageB in levels(factor(df.icc.age$age_bin))) if(ageA!=ageB){#ageB="(6,12]"
+    #check:
+    # print(sum(df.icc.age[df.icc.age$age_bin==ageA,c("metric","data_set")] == df.icc.age[df.icc.age$age_bin==ageB,c("metric","data_set")]))
+    #dim(df.icc.age[df.icc.age$age_bin==ageA,c("metric","data_set")])
+    #yes, the metric & data_set are matching across the two
+    r_X_age = rbind(r_X_age, cbind(ageA,ageB,cor.test(df.icc.age$icc_child_id[df.icc.age$age_bin==ageA],df.icc.age$icc_child_id[df.icc.age$age_bin==ageB])$estimate))
+  }
+}
+r_X_age=data.frame(r_X_age)
+colnames(r_X_age)[3]<-c("cor")
+r_X_age$cor=as.numeric(as.character(r_X_age$cor))
+r_X_age$ageA=factor(r_X_age$ageA,levels=age_levels)
+#r_X_age$ageB=factor(r_X_age$ageB,levels=age_levels)
 
 
-cor_t=t.test(rval_tab$m ~ rval_tab$p)
+#summary(r_X_age$cor) #mean correlation across corpora is zero!
 
 
+ggplot(r_X_age, aes(y = cor, x = ageA)) +
+  geom_violin(alpha = 0.5) +
+  geom_quasirandom() +  
+  theme() +labs( y = "r",x="Age")
 ```
 ```
 
 
-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. 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"]`). See below for fuller results.
 
 
-```{r print out anova results rec on cor}
-
-kable(round(reg_anova_cor,2))
-```
 
 
 
 
+## SM S: Code to reproduce text at the beginning of the "Reliability within corpus" section
 
 
 
 
 
 
-## Code to reproduce text and figures in "Exploratory analyses: Reliability within corpus"
+Figure 7 addresses this question, showing the distribution of ICC across our `r dim(df.icc.mixed)[1]` metrics in each of the `r length(levels(factor(df.icc.corpus$corpus)))` included corpora.  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.)
 
 
-```{r read in icc by corpus}
-df.icc.corpus<-read.csv("../output/df.icc.corpus.csv")
-df.icc.corpus$Type <- get_type(df.icc.corpus)
 
 
-```
+## SM T: Code to reproduce Figure 7
 
 
-Figure 5 addresses this question, showing the distribution of ICC across our `r dim(df.icc.mixed)[1]` metrics in each of the `r length(levels(factor(df.icc.corpus$corpus)))` included corpora.  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.)
 
 
-
-```{r icc-bycor-fig5, echo=F,fig.width=4, fig.height=10,fig.cap="Child ICC by metric type and pipeline, when considering each corpus separately."}
+```{r icc-bycor-fig7, echo=F,fig.width=4, fig.height=10,fig.cap="Child ICC by metric type and pipeline, when considering each corpus separately."}
 
 
 ggplot(df.icc.corpus, aes(y = icc_child_id, x = toupper(data_set))) +
 ggplot(df.icc.corpus, aes(y = icc_child_id, x = toupper(data_set))) +
   geom_violin(alpha = 0.5) +
   geom_violin(alpha = 0.5) +
   geom_quasirandom(aes(colour = Type,shape = Type)) +  
   geom_quasirandom(aes(colour = Type,shape = Type)) +  
-  theme(legend.position = "top", axis.title.y=element_blank() ,axis.text.x = element_text(angle = 90, vjust = 0.5, hjust=1)) +labs( y = "ICC child ID",x="Pipeline") +   
+  theme(legend.position = "top", axis.title.y=element_blank() ,axis.text.x = element_text(angle = 90, vjust = 0.5, hjust=1)) +labs( y = "Child ICC",x="Pipeline") +   
   facet_grid(cols=vars(corpus)) 
   facet_grid(cols=vars(corpus)) 
 
 
 ```
 ```
 
 
+## SM U: Code to reproduce text below Figure 7
 
 
-```{r icc-bycor-fig6, echo=F,fig.width=4, fig.height=10,fig.cap="Correlations in Child ICC across corpora. Each point indicates the correlation in Child ICC for the corpus named in the x-axis with every other corpus."}
-
-
-
-r_X_corpus = NULL
-
-for(corpusA in levels(factor(df.icc.corpus$corpus))){
-  for(corpusB in levels(factor(df.icc.corpus$corpus))) if(corpusA!=corpusB){
-    #check:
-    # print(sum(df.icc.corpus[df.icc.corpus$corpus==corpusA,c("metric","data_set")] == df.icc.corpus[df.icc.corpus$corpus==corpusB,c("metric","data_set")]))
-    #yes, the metric & data_set are matching across the two
-    r_X_corpus = rbind(r_X_corpus, cbind(corpusA,corpusB,cor.test(df.icc.corpus$icc_child_id[df.icc.corpus$corpus==corpusA],df.icc.corpus$icc_child_id[df.icc.corpus$corpus==corpusB])$estimate))
-  }
-}
-r_X_corpus=data.frame(r_X_corpus)
-colnames(r_X_corpus)[3]<-c("cor")
-r_X_corpus$cor=as.numeric(as.character(r_X_corpus$cor))
-
-#summary(r_X_corpus$cor) #mean correlation across corpora is zero!
-
-ggplot(r_X_corpus, aes(y = cor, x = corpusA)) +
-  geom_violin(alpha = 0.5) +
-  geom_quasirandom() +  
-  theme() +labs( y = "r",x="Corpus")
-```
-
-
-
-```{r reg model corpusm}
+```{r reg model corpus}
 
 
 
 
 cor_icc <- lm(icc_child_id ~ Type * data_set * corpus, data=df.icc.corpus) 
 cor_icc <- lm(icc_child_id ~ Type * data_set * corpus, data=df.icc.corpus) 
@@ -642,104 +640,34 @@ kable(round(reg_anova_cor_icc,2))
 
 
 ```
 ```
 
 
+## SM V: Code to reproduce Figure 8
 
 
-
-## Code to reproduce text and figures in "Exploratory analyses: Reliability across age groups"
-
+```{r icc-bycor-fig8, echo=F,fig.width=4, fig.height=10,fig.cap="Correlations in Child ICC across corpora. Each point indicates the correlation in Child ICC for the corpus named in the x-axis with every other corpus."}
 
 
 
 
-```{r prepAge}
-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]"
-
-df.icc.age$age_bin<-factor(df.icc.age$age_bin,levels=age_levels)
 
 
-df.icc.age$Type<-get_type(df.icc.age)
-```
-
-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.
-
-
-```{r relBYage-fig7, echo=F,fig.width=6, fig.height=10,fig.cap="Distribution of ICC attributed to corpus (a) and children (b), when binning children's age."}
-
-#this complicated section is just to add N of participants in each facet, we first estimate it:
-facet_labels_chi=facet_labels_cor=NULL
-for(thisage in levels(df.icc.age$age_bin)){#thisage="(0,6]"
-  facet_labels_cor = c(facet_labels_cor,paste0("N cor=",min(df.icc.age$ncor[df.icc.age$age_bin==thisage],na.rm=T))) #checked: there is no variation across metrics in n of corpora included
-    if(min(df.icc.age$nchi[df.icc.age$age_bin==thisage],na.rm=T) !=max(df.icc.age$nchi[df.icc.age$age_bin==thisage],na.rm=T)){
-    facet_labels_chi = c(facet_labels_chi,paste0("N chi=",paste(range(df.icc.age$nchi[df.icc.age$age_bin==thisage],na.rm=T),collapse="-"))) 
-  } else {
-    facet_labels_chi = c(facet_labels_chi,paste0("N chi=",min(df.icc.age$nchi[df.icc.age$age_bin==thisage],na.rm=T))) 
-  }
-}
-
-#and then we structure it so that it goes on the plot
-f_labels<-data.frame(age_bin=levels(df.icc.age$age_bin),facet_labels_chi=facet_labels_chi,facet_labels_cor=facet_labels_cor)
-
-f_labels$age_bin<-factor(f_labels$age_bin,levels=age_levels)
-
-ggplot(df.icc.age, aes(y = icc_child_id, x = toupper(data_set))) +
-  geom_violin(alpha = 0.5) +
-  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)
-
-```
-
-
-
-
-```{r icc-bycor-fig8, echo=F,fig.width=4, fig.height=4,fig.cap="Correlations in Child ICC across corpora. Each point indicates the correlation in Child ICC for the corpus named in the x-axis with every other corpus."}
-
-r_X_age = NULL
+r_X_corpus = NULL
 
 
-for(ageA in levels(factor(df.icc.age$age_bin))){#ageA="(0,6]"
-  for(ageB in levels(factor(df.icc.age$age_bin))) if(ageA!=ageB){#ageB="(6,12]"
+for(corpusA in levels(factor(df.icc.corpus$corpus))){
+  for(corpusB in levels(factor(df.icc.corpus$corpus))) if(corpusA!=corpusB){
     #check:
     #check:
-    # print(sum(df.icc.age[df.icc.age$age_bin==ageA,c("metric","data_set")] == df.icc.age[df.icc.age$age_bin==ageB,c("metric","data_set")]))
-    #dim(df.icc.age[df.icc.age$age_bin==ageA,c("metric","data_set")])
+    # print(sum(df.icc.corpus[df.icc.corpus$corpus==corpusA,c("metric","data_set")] == df.icc.corpus[df.icc.corpus$corpus==corpusB,c("metric","data_set")]))
     #yes, the metric & data_set are matching across the two
     #yes, the metric & data_set are matching across the two
-    r_X_age = rbind(r_X_age, cbind(ageA,ageB,cor.test(df.icc.age$icc_child_id[df.icc.age$age_bin==ageA],df.icc.age$icc_child_id[df.icc.age$age_bin==ageB])$estimate))
+    r_X_corpus = rbind(r_X_corpus, cbind(corpusA,corpusB,cor.test(df.icc.corpus$icc_child_id[df.icc.corpus$corpus==corpusA],df.icc.corpus$icc_child_id[df.icc.corpus$corpus==corpusB])$estimate))
   }
   }
 }
 }
-r_X_age=data.frame(r_X_age)
-colnames(r_X_age)[3]<-c("cor")
-r_X_age$cor=as.numeric(as.character(r_X_age$cor))
-r_X_age$ageA=factor(r_X_age$ageA,levels=age_levels)
-#r_X_age$ageB=factor(r_X_age$ageB,levels=age_levels)
+r_X_corpus=data.frame(r_X_corpus)
+colnames(r_X_corpus)[3]<-c("cor")
+r_X_corpus$cor=as.numeric(as.character(r_X_corpus$cor))
 
 
-#summary(r_X_age$cor) #mean correlation across corpora is zero!
+#summary(r_X_corpus$cor) #mean correlation across corpora is zero!
 
 
-ggplot(r_X_age, aes(y = cor, x = ageA)) +
+ggplot(r_X_corpus, aes(y = cor, x = corpusA)) +
   geom_violin(alpha = 0.5) +
   geom_violin(alpha = 0.5) +
   geom_quasirandom() +  
   geom_quasirandom() +  
-  theme() +labs( y = "r",x="Age")
-```
-
-
-
-```{r reg model age}
-
-
-age_icc <- lm(icc_child_id ~ Type * data_set * age_bin, data=df.icc.age) 
-#plot(age_icc)
-#binomial could be used,  diagnostic plots look good
-
-reg_sum_age_icc=summary(age_icc)
-
-reg_anova_age_icc=Anova(age_icc)
-
+  theme() +labs( y = "r",x="Corpus")
 ```
 ```
 
 
-As we did in the previous section for corpus, we checked whether Child ICC differed by talker types and pipelines across age bins by fitting a linear model with the formula $lm(Child_ICC ~ type * pipeline * age_bin)$. We found an adjusted R-squared of `r round(reg_sum_age_icc$adj.r.squared*100)`%, suggesting this model explained about a third of the variance in Child ICC. However, a Type 3 ANOVA on this model revealed only an interaction of type and age bin, as well as a main effect of age bin, suggesting less complex effects than in the case of corpus. See below for more information.
-
-
-```{r print out anova results rec on icc by age}
-kable(round(reg_anova_age_icc,2))
-
-```
 
 
 
 
 ## Save information about packages used
 ## Save information about packages used

+ 11 - 9
CODE/SM.html

@@ -1938,13 +1938,15 @@ where type indicates whether the measure pertained to the key child,
 found an adjusted R-squared of 65%, suggesting much of the variance
 found an adjusted R-squared of 65%, suggesting much of the variance
 across Child ICCs was explained by these factors. A Type 3 ANOVA on this
 across Child ICCs was explained by these factors. A Type 3 ANOVA on this
 model revealed type was a signficant predictor (F(4) = 31.2, p&lt;.001),
 model revealed type was a signficant predictor (F(4) = 31.2, p&lt;.001),
-whereas as was pipeline (F(1) = 5.1, p = 0.027) nor the interaction
-between type and pipeline were significant. The main effect of type
-emerged because output metrics tended to have higher Child ICC (M = .4,
-SD = .06) than those associated to adults in general (M = .32, SD =
-.05), females (M = .36, SD = .06), and males (M = .36, SD = .04);
-whereas those associated with other children had even higher Child ICCs
-(M = .58, SD = .06).</p>
+whereas as was pipeline (F(1) = 5.1, p = 0.027); the interaction between
+type and pipeline was not significant. The main effect of type emerged
+because output metrics tended to have higher Child ICC (M = .4, SD =
+.06) than those associated to adults in general (M = .32, SD = .05),
+females (M = .36, SD = .06), and males (M = .36, SD = .04); whereas
+those associated with other children had even higher Child ICCs (M =
+.58, SD = .06). The main effect of pipeline arose because of slightly
+higher Child ICCs for the ACLEW metrics (M = .4, SD = .09) than for LENA
+metrics (M = .38, SD = .09).</p>
 </div>
 </div>
 <div id="code-to-reproduce-table-3" class="section level2">
 <div id="code-to-reproduce-table-3" class="section level2">
 <h2>Code to reproduce Table 3</h2>
 <h2>Code to reproduce Table 3</h2>
@@ -2055,8 +2057,8 @@ adults, other children; and pipeline LENA or ACLEW. We found an adjusted
 R-squared of 32%, suggesting this model did not explain a great deal of
 R-squared of 32%, suggesting this model did not explain a great deal of
 variance in correlation coefficients. A Type 3 ANOVA on this model
 variance in correlation coefficients. A Type 3 ANOVA on this model
 revealed a significant effect of pipeline (F = 5.13, p = 0.03), due to
 revealed a significant effect of pipeline (F = 5.13, p = 0.03), due to
-higher correlations for ACLEW (m = 0.59) than for LENA metrics (m =
-0.54). See below for fuller results.</p>
+higher correlations for ACLEW (M = 0.59, SD = 0.1) than for LENA metrics
+(m = M = 0.54, SD = 0.12). See below for fuller results.</p>
 <table>
 <table>
 <thead>
 <thead>
 <tr>
 <tr>

BIN
CODE/SM_files/figure-html/icc-allexp-fig3-1.png


BIN
CODE/SM_files/figure-html/icc-examples-fig2-1.png


BIN
CODE/SM_files/figure-html/icc-sim-plot-1.png


BIN
CODE/SM_files/figure-html/unnamed-chunk-2-1.png


+ 2 - 0
CODE/create-all-icc.R

@@ -17,10 +17,12 @@ df.icc.mixed.cols = c("data_set","age_bin", "metric", "iqr",
 df.icc.mixed = data.frame(matrix(ncol=length(df.icc.mixed.cols),nrow=0, dimnames=list(NULL, df.icc.mixed.cols)),
 df.icc.mixed = data.frame(matrix(ncol=length(df.icc.mixed.cols),nrow=0, dimnames=list(NULL, df.icc.mixed.cols)),
                           stringsAsFactors = FALSE)
                           stringsAsFactors = FALSE)
 
 
+
 for (data_set in data_sets){   # data_set = "aclew"
 for (data_set in data_sets){   # data_set = "aclew"
   # Load data
   # Load data
   mydat <- read.csv(paste0('../data_output/', data_set,'_metrics_scaled.csv'))
   mydat <- read.csv(paste0('../data_output/', data_set,'_metrics_scaled.csv'))
   metrics <- colnames(mydat)[!is.element(colnames(mydat), no.scale.columns)]
   metrics <- colnames(mydat)[!is.element(colnames(mydat), no.scale.columns)]
+  
   for(metric in metrics) 
   for(metric in metrics) 
   {  # metric = "voc_chi_ph"
   {  # metric = "voc_chi_ph"
     icc.row <- new_fit_models(mydat, data_set, metric, NA, TRUE)
     icc.row <- new_fit_models(mydat, data_set, metric, NA, TRUE)

+ 86 - 0
CODE/create-all-rs.R

@@ -0,0 +1,86 @@
+
+mydat_lena <- read.csv(paste0('../data_output/', "lena",'_metrics_scaled.csv'))
+#table(mydat_lena$session_id)[table(mydat_lena$session_id)>1]
+mydat_lena=mydat_lena[order(mydat_lena$experiment,mydat_lena$child_id,mydat_lena$age),]
+# dim(mydat_lena) #1253 obs 
+key=mydat_lena[,c("experiment","child_id","age")]
+
+dist_contig_lena <- define_contiguous(mydat_lena)
+# dim(dist_contig_lena) #684
+# table(dist_contig_lena$session_id)[table(dist_contig_lena$session_id)>1] #0=no repeats
+mydat_lena = merge(mydat_lena,dist_contig_lena[,c("session_id","next_session")],by="session_id", all.x=T) #note that we need to do all.x=T, bc we need to keep others that are next session
+
+
+#table(dist_contig_lena$experiment) #this is the number of eligible recordings per corpus
+
+#table(dist_contig_lena$experiment[!duplicated(dist_contig_lena$child_id)])#this is the number of eligible children per corpus
+#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 10 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),]
+#dim(mydat_aclew)
+# dim(dist_contig_aclew) #686 -- for some reason, we have 2 more eligible recs here... not sure why
+#length(dist_contig_aclew$session_id[!(dist_contig_aclew$session_id %in% dist_contig_lena$session_id)])  # in fact, we have lots of sessions not in common!
+#length(dist_contig_lena$session_id[!(dist_contig_lena$session_id %in% dist_contig_aclew$session_id)])
+# they are present in aclew but not in lena
+# NOTE: I have "winnipeg C175 C175_20151201" "winnipeg C175 C175_20160301" for lena but not aclew; and i have "fausey-trio T066 T066/T066_000700"   "quechua 1096 20190630_190025_009107" "quechua 1096 20190702_193551_008712" 
+
+#one thing that drove me crazy was that, probably because of the small differences in inclusion (2 recs in aclew & lena respectively), I was ending up with different lists of pairings across aclew & lena. So to simplify, I'll impose the same pairing across both, which involves losing a couple of additional recs in lena
+xxx=mydat_aclew[mydat_aclew$session_id %in% mydat_lena$session_id,]
+rownames(xxx)<-xxx$session_id
+xxx=xxx[mydat_lena$session_id,]
+
+dist_contig_aclew <- define_contiguous(xxx) 
+mydat_aclew = merge(mydat_aclew,dist_contig_aclew[,c("session_id","next_session")],by="session_id", all.x=T)
+
+# dist_contig_lena=dist_contig_lena[((dist_contig_lena$session_id %in% dist_contig_aclew$session_id) & (dist_contig_lena$next_session %in% dist_contig_aclew$next_session)),]
+# dist_contig_lena=dist_contig_lena[order(dist_contig_lena$session_id),]
+# 
+# dist_contig_aclew=dist_contig_aclew[((dist_contig_aclew$session_id %in% dist_contig_lena$session_id) & (dist_contig_aclew$next_session %in% dist_contig_aclew$next_session)),]
+# dist_contig_aclew=dist_contig_aclew[order(dist_contig_aclew$session_id),]
+
+
+nsamples=20
+
+all_rs=data.frame(matrix(NA,nrow=dim(df.icc.mixed)[1],ncol=(nsamples)))
+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
+
+all_iccs=data.frame(matrix(NA,nrow=dim(df.icc.mixed)[1],ncol=(nsamples)))
+colnames(all_iccs[,1:nsamples])<-paste0("sample",1:nsamples)
+all_iccs$data_set<-df.icc.mixed$data_set
+all_iccs$metric<-df.icc.mixed$metric
+
+for(i in 1:nsamples){#i=1
+  
+  #for each child, sample 2 contiguous recordings that are less than 2 months away
+  #step 1: sample one session per child among the list of sessions that are close by
+  #we use the lena one because there is no difference across lena & aclew in terms of which kids have which sessions, since in this paper all recs have both lena and aclew, so it's just a question of using one of them
+  close_sessions <- dist_contig_lena  %>%
+    group_by(child_id)%>%
+    slice_sample(n = 1) 
+  #table(close_sessions$experiment) #these have to be similar
+  #dim(close_sessions)
+  
+  for(j in 1:dim(df.icc.mixed)[1]){# j=1
+    data_set=df.icc.mixed[j,"data_set"]
+    metric=df.icc.mixed[j,"metric"]
+    
+    if(data_set=="aclew") dat_for_cor<-mydat_aclew else  dat_for_cor<-mydat_lena
+    
+    #step 2: get data from those sampled sessions as rec1
+    rec1 = subset(dat_for_cor,session_id %in% close_sessions$session_id)  
+    #step 3: get the next session
+    rec2 = subset(dat_for_cor,session_id %in% close_sessions$next_session)   
+    
+    all_rs[all_rs$data_set==data_set & all_rs$metric==metric,i]<-
+      cor.test(rec1[,metric],rec2[,metric])$estimate
+    
+  }
+}
+
+write.csv(all_rs,'../data_output/all_rs.csv')

+ 34 - 0
CODE/create-sib-subdataset.R

@@ -0,0 +1,34 @@
+mydat_aclew <- read.csv(paste0('../data_output/', 'aclew','_metrics_scaled.csv')) 
+mydat_aclew <- mydat_aclew[is.element(mydat_aclew$experiment, corpora),]
+
+
+read.csv("../input/aclew_md.csv")->x
+x$labname[x$labname=="ROW"]<-"luc"
+x$labname[x$labname=="SOD"]<-"win"
+x$ch_id=paste(tolower(x$labname),as.character(x$child_level_id))
+x$n_of_siblings<-x$number_older_sibs
+
+x$ch_id[x$labname %in% c("BER")] = paste(tolower(x$labname[x$labname %in% c("BER")]),as.numeric(as.character(x$child_level_id[x$labname %in% c("BER")])))
+x=x[!duplicated(x$ch_id),]
+
+mydat_aclew$lab=substr(mydat_aclew$experiment,1,3)
+mydat_aclew$ch_id=paste(mydat_aclew$lab,gsub(".* ","",mydat_aclew$child_id))
+mydat_aclew$ch_id[mydat_aclew$experiment=="warlaumont"]=gsub(" 0"," ",mydat_aclew$ch_id[mydat_aclew$experiment=="warlaumont"])
+mydat_aclew$ch_id[mydat_aclew$experiment=="winnipeg"]=gsub(" C"," CW",mydat_aclew$ch_id[mydat_aclew$experiment=="winnipeg"])
+
+#sort(factor(mydat_aclew$ch_id[mydat_aclew$experiment=="winnipeg"]))
+#sort(x$ch_id[x$lab=="win"])
+#sum(mydat_aclew$ch_id %in% x$ch_id)
+#sum(x$ch_id %in% mydat_aclew$ch_id)
+
+metadata=x[,c("ch_id","n_of_siblings")]
+read.csv("../input/quechua_md.csv")->x 
+x$ch_id=paste("que",x$child_id)
+metadata=rbind(metadata,x[,c("ch_id","n_of_siblings")])
+mydat2=merge(mydat_aclew,metadata,all.x=T,by="ch_id")
+#table(mydat2$n_of_siblings,mydat2$experiment)
+
+mydat2$sib_presence=ifelse(mydat2$n_of_siblings!=0,"present","absent")
+
+
+write.csv(mydat2[,c("age_s","n_of_siblings","sib_presence","experiment","child_id")],"../data_output/dat_sib_ana.csv")

+ 16 - 0
CODE/regenerate_data.R

@@ -1,14 +1,21 @@
 # This code cannot be reproduced without access to the underlying datasets
 # This code cannot be reproduced without access to the underlying datasets
 # It also relies on packages, functions, & variables that are called in SM.Rmd
 # It also relies on packages, functions, & variables that are called in SM.Rmd
 
 
+#contains ugly fix due to simple ctc & lena ctc not controlling for length
+
 remove_single_rec_kids = TRUE
 remove_single_rec_kids = TRUE
 
 
 for (data_set in data_sets){ #data_set="aclew";data_set="lena"
 for (data_set in data_sets){ #data_set="aclew";data_set="lena"
   if(data_set=="aclew"){
   if(data_set=="aclew"){
     mydat <- read.csv(paste0('../input/el1000-metrics/output/', data_set,'_metrics.csv'))
     mydat <- read.csv(paste0('../input/el1000-metrics/output/', data_set,'_metrics.csv'))
+    #ugly fix for simple CTC & lena CTC not controlling for length
+    mydat$simple_CTC_ph = mydat$simple_CTC/(mydat$duration_vtc/(60*60*1000))
   } else{
   } else{
     mydat <- read.csv(paste0('../input/el1000-metrics/output/', data_set,'_metrics_avass.csv'))
     mydat <- read.csv(paste0('../input/el1000-metrics/output/', data_set,'_metrics_avass.csv'))
     mydat=mydat[,colnames(mydat)!="X"] #for some reason, this version has row names - remove that col to avoid having issues downastream
     mydat=mydat[,colnames(mydat)!="X"] #for some reason, this version has row names - remove that col to avoid having issues downastream
+    #ugly fix for simple CTC & lena CTC not controlling for length
+    mydat$lena_CTC_ph=mydat$lena_CTC/(mydat$duration_its/(60*60*1000))
+    mydat$lena_CVC_ph=mydat$lena_CVC/(mydat$duration_its/(60*60*1000))
   }
   }
   
   
   # Remove Cougar non-normatives
   # Remove Cougar non-normatives
@@ -19,9 +26,14 @@ for (data_set in data_sets){ #data_set="aclew";data_set="lena"
   
   
   if(data_set=="aclew"){
   if(data_set=="aclew"){
     mydat2 <- read.csv(paste0('../input/laac-metrics/output/', data_set,'_metrics.csv'))
     mydat2 <- read.csv(paste0('../input/laac-metrics/output/', data_set,'_metrics.csv'))
+    #ugly fix for simple CTC & lena CTC not controlling for length
+    mydat2$simple_CTC_ph = mydat2$simple_CTC/(mydat2$duration_vtc/(60*60*1000))
   } else{
   } else{
     mydat2 <- read.csv(paste0('../input/laac-metrics/output/', data_set,'_metrics_avass.csv'))
     mydat2 <- read.csv(paste0('../input/laac-metrics/output/', data_set,'_metrics_avass.csv'))
     mydat2=mydat2[,colnames(mydat2)!="X"] #for some reason, this version has row names - remove that col to avoid having issues downastream
     mydat2=mydat2[,colnames(mydat2)!="X"] #for some reason, this version has row names - remove that col to avoid having issues downastream
+    #ugly fix for simple CTC & lena CTC not controlling for length
+    mydat2$lena_CTC_ph=mydat2$lena_CTC/(mydat2$duration_its/(60*60*1000))
+    mydat2$lena_CVC_ph=mydat2$lena_CVC/(mydat2$duration_its/(60*60*1000))
   }
   }
   # Remove FauseyElse
   # Remove FauseyElse
   # if needed, in the terminal, do `datalad get input/el1000-metrics/EL1000/fausey-trio/metadata/recordings.csv`
   # if needed, in the terminal, do `datalad get input/el1000-metrics/EL1000/fausey-trio/metadata/recordings.csv`
@@ -34,8 +46,12 @@ for (data_set in data_sets){ #data_set="aclew";data_set="lena"
   #columns are not in the same order across el1000-metrics & laac-metrics
   #columns are not in the same order across el1000-metrics & laac-metrics
   mydat2=mydat2[,colnames(mydat)]
   mydat2=mydat2[,colnames(mydat)]
   
   
+  
   mydat=rbind(mydat,mydat2)
   mydat=rbind(mydat,mydat2)
   
   
+  #ugly fix removing columns that we do not want to include
+  mydat=mydat[,!(colnames(mydat)%in%c("lena_CTC","simple_CTC","lena_CVC","voc_chi"))]
+  
   #remove no overlap metrics
   #remove no overlap metrics
   mydat = mydat[,grep("noov",colnames(mydat),invert=T)]
   mydat = mydat[,grep("noov",colnames(mydat),invert=T)]
   mydat = mydat[,grep("no_overlap",colnames(mydat),invert=T)]
   mydat = mydat[,grep("no_overlap",colnames(mydat),invert=T)]

+ 1 - 1
CODE/sessionInfo.txt

@@ -9,7 +9,7 @@ LAPACK: /Library/Frameworks/R.framework/Versions/4.3-x86_64/Resources/lib/libRla
 locale:
 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
 
 
-time zone: Europe/Dublin
+time zone: Europe/Paris
 tzcode source: internal
 tzcode source: internal
 
 
 attached base packages:
 attached base packages:

+ 18 - 24
OUTPUT/df.icc.age.csv

@@ -21,8 +21,6 @@
 "aclew","(0,6]","cp_dur","1.49247535245342","1.30373274664621","0.656538945133883","1.98576604831926","0.149183121134841","0.143197970685483","0.11207743385981","0.0371056872750314","0.111727521080077","0.0369898409915187","0.848160575193005","0.334256669462371","0.192327431718719","0.920956337289127","0.183317458760467","0.0401194880749842","130","63","6","full","0.668395278363138"
 "aclew","(0,6]","cp_dur","1.49247535245342","1.30373274664621","0.656538945133883","1.98576604831926","0.149183121134841","0.143197970685483","0.11207743385981","0.0371056872750314","0.111727521080077","0.0369898409915187","0.848160575193005","0.334256669462371","0.192327431718719","0.920956337289127","0.183317458760467","0.0401194880749842","130","63","6","full","0.668395278363138"
 "aclew","(0,6]","avg_can_voc_dur_chi","1.4730247029066","0.592366006393355","0.645865798181575","0.917165776638355","0.0743323680777528","0.0737370337173068","0.074332368077753",NA,"0.0745322782224193",NA,"0.928157130844398","0.273006004004343",NA,"0.963409119141187","0.0817461201468322","0.00800908642952538","122","61",NA,"no_exp","0.109768270159305"
 "aclew","(0,6]","avg_can_voc_dur_chi","1.4730247029066","0.592366006393355","0.645865798181575","0.917165776638355","0.0743323680777528","0.0737370337173068","0.074332368077753",NA,"0.0745322782224193",NA,"0.928157130844398","0.273006004004343",NA,"0.963409119141187","0.0817461201468322","0.00800908642952538","122","61",NA,"no_exp","0.109768270159305"
 "aclew","(0,6]","can_voc_chi_ph","1.43017538407248","1.04513332678905","0.579030391272293","1.80497145321267","0.505419747485622","0.492634270881688","0.430189533687406","0.0752302137982145","0.447388271729528","0.0782378758602779","0.514353295644671","0.668870893169622","0.279710342783884","0.717184282904102","0.517931020103576","0.0252967492218883","127","62","6","full","0.00974474357672004"
 "aclew","(0,6]","can_voc_chi_ph","1.43017538407248","1.04513332678905","0.579030391272293","1.80497145321267","0.505419747485622","0.492634270881688","0.430189533687406","0.0752302137982145","0.447388271729528","0.0782378758602779","0.514353295644671","0.668870893169622","0.279710342783884","0.717184282904102","0.517931020103576","0.0252967492218883","127","62","6","full","0.00974474357672004"
-"aclew","(0,6]","voc_chi","1.56025431626062","-0.2259175609123","0.351394693844333","-0.642916825068455","0.800857631443877","0.799721253065946","0.499786911663312","0.301070719780567","0.439841196255219","0.264959530662766","0.175256725549928","0.663205244441884","0.514742198253423","0.418636746535618","0.801140204866258","0.00141895180031206","130","64","6","full","0.233257165463884"
-"aclew","(0,6]","simple_CTC","1.5674917532925","-0.136150667210233","0.339596314063276","-0.400919154808214","0.830486728658303","0.830092862516558","0.600309980325431","0.230176748332874","0.576278748597974","0.220962457451917","0.162727422633529","0.759130257991324","0.470066439401833","0.403394871848328","0.830567121921499","0.000474259404941835","129","63","6","full","0.022927807287034"
 "aclew","(0,6]","peak_voc_chi","1.47264563041752","-0.634395112192915","0.647540080566758","-0.979700147113152","0.298093165130105","0.295160635597787","0.067022715003012","0.231070450127093","0.0668120849124506","0.230344272594086","0.699700975256662","0.258480337574158","0.479941947108279","0.836481305981588","0.304998263142982","0.00983762754519519","128","64","6","full","0.134503054869378"
 "aclew","(0,6]","peak_voc_chi","1.47264563041752","-0.634395112192915","0.647540080566758","-0.979700147113152","0.298093165130105","0.295160635597787","0.067022715003012","0.231070450127093","0.0668120849124506","0.230344272594086","0.699700975256662","0.258480337574158","0.479941947108279","0.836481305981588","0.304998263142982","0.00983762754519519","128","64","6","full","0.134503054869378"
 "aclew","(0,6]","voc_fem_ph","1.50971740663039","-1.97474245310023","0.551383428372304","-3.5814323599273","0.539124264879389","0.493192673762422","0.472396667716825","0.0667275971625638","0.487054006828757","0.0687979949586853","0.475175607240312","0.697892546764011","0.262293718870059","0.689329824714057","0.578389341968856","0.0851966682064339","130","64","6","full","0.00310126272659958"
 "aclew","(0,6]","voc_fem_ph","1.50971740663039","-1.97474245310023","0.551383428372304","-3.5814323599273","0.539124264879389","0.493192673762422","0.472396667716825","0.0667275971625638","0.487054006828757","0.0687979949586853","0.475175607240312","0.697892546764011","0.262293718870059","0.689329824714057","0.578389341968856","0.0851966682064339","130","64","6","full","0.00310126272659958"
 "aclew","(0,6]","peak_voc_fem_ph","1.38262157869046","-1.49289888796614","0.657127938393447","-2.27185423224584","0.0669804243079954","0.063482631645807","0.0446454885503204","0.0223349357576749","0.0434007796157924","0.0217122413938681","0.90700714219283","0.208328537689373","0.147350742766598","0.952369225769517","0.11570374995501","0.0522211183092027","123","63","6","full","0.442972409125555"
 "aclew","(0,6]","peak_voc_fem_ph","1.38262157869046","-1.49289888796614","0.657127938393447","-2.27185423224584","0.0669804243079954","0.063482631645807","0.0446454885503204","0.0223349357576749","0.0434007796157924","0.0217122413938681","0.90700714219283","0.208328537689373","0.147350742766598","0.952369225769517","0.11570374995501","0.0522211183092027","123","63","6","full","0.442972409125555"
@@ -41,6 +39,7 @@
 "aclew","(0,6]","avg_voc_dur_och","1.35718240243259","0.843761924161075","0.500055223177838","1.6873374880458","0.612530129466828","0.602338356546006","0.612530129466828",NA,"0.635177339339872",NA,"0.401795878439238","0.796980137355927",NA,"0.633873708588105","0.618977167325312","0.0166388107793055","128","61",NA,"no_exp","0.00024194537418672"
 "aclew","(0,6]","avg_voc_dur_och","1.35718240243259","0.843761924161075","0.500055223177838","1.6873374880458","0.612530129466828","0.602338356546006","0.612530129466828",NA,"0.635177339339872",NA,"0.401795878439238","0.796980137355927",NA,"0.633873708588105","0.618977167325312","0.0166388107793055","128","61",NA,"no_exp","0.00024194537418672"
 "aclew","(0,6]","avg_voc_dur_chi","1.36471047599816","0.499505846248829","0.661757143634247","0.754817459930445","0.342921282112084","0.341019205658628","0.0832408537808605","0.259680428331224","0.0919810321189481","0.286946526063726","0.726071104626539","0.303283748524295","0.535673898994272","0.852098060452281","0.346565891013766","0.00554668535513863","127","63","6","full","0.143266989552209"
 "aclew","(0,6]","avg_voc_dur_chi","1.36471047599816","0.499505846248829","0.661757143634247","0.754817459930445","0.342921282112084","0.341019205658628","0.0832408537808605","0.259680428331224","0.0919810321189481","0.286946526063726","0.726071104626539","0.303283748524295","0.535673898994272","0.852098060452281","0.346565891013766","0.00554668535513863","127","63","6","full","0.143266989552209"
 "aclew","(0,6]","voc_dur_fem_ph","1.53364550225071","-1.86019176630539","0.56295004462424","-3.30436383133612","0.444721941867662","0.410008290320682","0.444721941867661",NA,"0.441135026465359",NA,"0.550799449744115","0.664179965420035",NA,"0.742158641898156","0.4880652699273","0.0780569796066178","130","64",NA,"no_exp","0.0172046544001357"
 "aclew","(0,6]","voc_dur_fem_ph","1.53364550225071","-1.86019176630539","0.56295004462424","-3.30436383133612","0.444721941867662","0.410008290320682","0.444721941867661",NA,"0.441135026465359",NA,"0.550799449744115","0.664179965420035",NA,"0.742158641898156","0.4880652699273","0.0780569796066178","130","64",NA,"no_exp","0.0172046544001357"
+"aclew","(0,6]","simple_CTC_ph","1.35010833513439","-0.197417883072709","0.491748335857651","-0.401461212326007","0.670628451660519","0.670029468857499","0.485314062078429","0.185314389582091","0.521364310145863","0.199079969928741","0.35383802675377","0.722055614302571","0.44618378492359","0.594842858874317","0.670922635262141","0.000893166404641247","128","62","6","full","0.088308016741458"
 "aclew","(6,12]","wc_adu_ph","1.42295855551096","-0.545076250935824","0.304114080845533","-1.7923413786706","0.483187143160126","0.480739783615116","0.329899358924752","0.153287784235373","0.342401760574875","0.159097026947497","0.536398835834254","0.585151057911438","0.398869686674103","0.732392542175474","0.485804818104659","0.00506503448954375","418","129","8","full","0.000370898387876723"
 "aclew","(6,12]","wc_adu_ph","1.42295855551096","-0.545076250935824","0.304114080845533","-1.7923413786706","0.483187143160126","0.480739783615116","0.329899358924752","0.153287784235373","0.342401760574875","0.159097026947497","0.536398835834254","0.585151057911438","0.398869686674103","0.732392542175474","0.485804818104659","0.00506503448954375","418","129","8","full","0.000370898387876723"
 "aclew","(6,12]","sc_fem_ph","1.39602920213464","-0.488889162520412","0.294740733781752","-1.65870918568867","0.530465843447215","0.528323272991253","0.412172360134887","0.11829348331233","0.434063137253143","0.124576137192578","0.494471460857086","0.65883468127683","0.352953449044741","0.703186647240323","0.532362308647231","0.00403903565597837","420","129","8","full","0.00674288338147925"
 "aclew","(6,12]","sc_fem_ph","1.39602920213464","-0.488889162520412","0.294740733781752","-1.65870918568867","0.530465843447215","0.528323272991253","0.412172360134887","0.11829348331233","0.434063137253143","0.124576137192578","0.494471460857086","0.65883468127683","0.352953449044741","0.703186647240323","0.532362308647231","0.00403903565597837","420","129","8","full","0.00674288338147925"
 "aclew","(6,12]","sc_mal_ph","1.33895635259617","-0.526064905540312","0.311550123527296","-1.68854019245549","0.477188089006927","0.474945632444857","0.37496888933565","0.102219199671278","0.396773899729125","0.108163401376102","0.553214217630389","0.629899912469532","0.328882047816693","0.743783716970457","0.479644946224329","0.00469931377947122","412","129","8","full","1.69305880623149e-07"
 "aclew","(6,12]","sc_mal_ph","1.33895635259617","-0.526064905540312","0.311550123527296","-1.68854019245549","0.477188089006927","0.474945632444857","0.37496888933565","0.102219199671278","0.396773899729125","0.108163401376102","0.553214217630389","0.629899912469532","0.328882047816693","0.743783716970457","0.479644946224329","0.00469931377947122","412","129","8","full","1.69305880623149e-07"
@@ -63,8 +62,6 @@
 "aclew","(6,12]","cp_dur","1.39904700131512","0.698389348940634","0.303077703811806","2.3043244031382","0.456065963737471","0.452147144745971","0.366173613224914","0.089892350512556","0.37322229597969","0.0916227391532443","0.554404529828063","0.61091922213963","0.302692482815884","0.744583460619468","0.460739803052206","0.00859265830623531","426","129","8","full","0.114219985485036"
 "aclew","(6,12]","cp_dur","1.39904700131512","0.698389348940634","0.303077703811806","2.3043244031382","0.456065963737471","0.452147144745971","0.366173613224914","0.089892350512556","0.37322229597969","0.0916227391532443","0.554404529828063","0.61091922213963","0.302692482815884","0.744583460619468","0.460739803052206","0.00859265830623531","426","129","8","full","0.114219985485036"
 "aclew","(6,12]","avg_can_voc_dur_chi","1.37060950919718","-0.234406335412454","0.313003909139198","-0.748892676954426","0.428144097438557","0.427737148127648","0.428144097438557",NA,"0.445177923714566",NA,"0.594607341054742","0.667216549341041",NA,"0.771107866030909","0.428687644265149","0.00095049613750157","419","128",NA,"no_exp","0.601933897529673"
 "aclew","(6,12]","avg_can_voc_dur_chi","1.37060950919718","-0.234406335412454","0.313003909139198","-0.748892676954426","0.428144097438557","0.427737148127648","0.428144097438557",NA,"0.445177923714566",NA,"0.594607341054742","0.667216549341041",NA,"0.771107866030909","0.428687644265149","0.00095049613750157","419","128",NA,"no_exp","0.601933897529673"
 "aclew","(6,12]","can_voc_chi_ph","1.37928155042673","1.24130423927665","0.296597721423448","4.18514421931267","0.495750263662524","0.482592915539735","0.366330261175405","0.129420002487123","0.371461418089558","0.131232777490916","0.511312719648672","0.609476347440619","0.362260648554208","0.715061339780492","0.509133190123928","0.0265402745841932","421","129","8","full","1.18140624849459e-05"
 "aclew","(6,12]","can_voc_chi_ph","1.37928155042673","1.24130423927665","0.296597721423448","4.18514421931267","0.495750263662524","0.482592915539735","0.366330261175405","0.129420002487123","0.371461418089558","0.131232777490916","0.511312719648672","0.609476347440619","0.362260648554208","0.715061339780492","0.509133190123928","0.0265402745841932","421","129","8","full","1.18140624849459e-05"
-"aclew","(6,12]","voc_chi","1.47412646390434","0.681305718395221","0.25691228545088","2.6519001113533","0.621557545559509","0.616423141794686","0.492581904346678","0.128975641212829","0.495825037868226","0.129824810095789","0.380934099787473","0.704148448743748","0.360312100956641","0.617198590234515","0.624683686295359","0.00826054450067255","427","128","8","full","0.00209051260529134"
-"aclew","(6,12]","simple_CTC","1.53265565704713","0.805397436411961","0.258894271814421","3.1109125388038","0.60723512468339","0.60008630218054","0.489566491045485","0.117668633637909","0.483482662279795","0.116206368897083","0.387883997457709","0.695329175484385","0.340890552666224","0.62280333770598","0.611859044257305","0.0117727420767652","425","127","8","full","0.0441932847052486"
 "aclew","(6,12]","peak_voc_chi","1.28674727669548","0.794782890817058","0.300560029863576","2.64433993827392","0.44807521385756","0.442936076639182","0.419515983818928","0.028559230038636","0.414495700357583","0.0282174661112487","0.545319986843605","0.643813404922252","0.167980552776947","0.738457843646884","0.45440543950381","0.0114693628646286","426","128","8","full","0.0118504037936313"
 "aclew","(6,12]","peak_voc_chi","1.28674727669548","0.794782890817058","0.300560029863576","2.64433993827392","0.44807521385756","0.442936076639182","0.419515983818928","0.028559230038636","0.414495700357583","0.0282174661112487","0.545319986843605","0.643813404922252","0.167980552776947","0.738457843646884","0.45440543950381","0.0114693628646286","426","128","8","full","0.0118504037936313"
 "aclew","(6,12]","voc_fem_ph","1.36558374650489","-0.0437145418410082","0.286242241553367","-0.152718695898202","0.529957968657212","0.529940109188476","0.404307837564642","0.125650131092567","0.41485062320475","0.128926600838342","0.482298910675471","0.644088987023338","0.359063505300027","0.694477437124829","0.52997380897184","3.3699783363452e-05","423","127","8","full","0.877674584807725"
 "aclew","(6,12]","voc_fem_ph","1.36558374650489","-0.0437145418410082","0.286242241553367","-0.152718695898202","0.529957968657212","0.529940109188476","0.404307837564642","0.125650131092567","0.41485062320475","0.128926600838342","0.482298910675471","0.644088987023338","0.359063505300027","0.694477437124829","0.52997380897184","3.3699783363452e-05","423","127","8","full","0.877674584807725"
 "aclew","(6,12]","peak_voc_fem_ph","1.49087919984365","-0.147698335450341","0.333009709188416","-0.443525613142929","0.348755079407533","0.348627232787368","0.216410226974348","0.132344852433189","0.23378255664635","0.142968834668254","0.703523602685853","0.483510658255172","0.378112198518183","0.838763138606992","0.34899381273907","0.000366579951701287","423","127","8","full","0.291922639282524"
 "aclew","(6,12]","peak_voc_fem_ph","1.49087919984365","-0.147698335450341","0.333009709188416","-0.443525613142929","0.348755079407533","0.348627232787368","0.216410226974348","0.132344852433189","0.23378255664635","0.142968834668254","0.703523602685853","0.483510658255172","0.378112198518183","0.838763138606992","0.34899381273907","0.000366579951701287","423","127","8","full","0.291922639282524"
@@ -83,6 +80,7 @@
 "aclew","(6,12]","avg_voc_dur_och","1.58854561961483","0.419472085171305","0.243174672684229","1.72498262479829","0.654366629279535","0.652249494516557","0.651366770970105","0.00299985830942285","0.63923435172329","0.00294398266406753","0.339195570780156","0.799521326621929","0.0542584801120298","0.58240498862918","0.655484889887053","0.00323539537049573","424","129","8","full","0.000332484986780175"
 "aclew","(6,12]","avg_voc_dur_och","1.58854561961483","0.419472085171305","0.243174672684229","1.72498262479829","0.654366629279535","0.652249494516557","0.651366770970105","0.00299985830942285","0.63923435172329","0.00294398266406753","0.339195570780156","0.799521326621929","0.0542584801120298","0.58240498862918","0.655484889887053","0.00323539537049573","424","129","8","full","0.000332484986780175"
 "aclew","(6,12]","avg_voc_dur_chi","1.55740545817867","0.0307948484959447","0.308183650541756","0.0999236930376107","0.454527709112742","0.45452019313769","0.447793150917955","0.00673455819478326","0.462303589565992","0.00695278706520416","0.563147956973035","0.679929106279465","0.0833833740334616","0.750431846987477","0.454536728928361","1.6535790671561e-05","422","129","8","full","0.677416519605636"
 "aclew","(6,12]","avg_voc_dur_chi","1.55740545817867","0.0307948484959447","0.308183650541756","0.0999236930376107","0.454527709112742","0.45452019313769","0.447793150917955","0.00673455819478326","0.462303589565992","0.00695278706520416","0.563147956973035","0.679929106279465","0.0833833740334616","0.750431846987477","0.454536728928361","1.6535790671561e-05","422","129","8","full","0.677416519605636"
 "aclew","(6,12]","voc_dur_fem_ph","1.36841010946693","-0.558179506390883","0.297168936020881","-1.87832387148185","0.533247479155375","0.530525754437056","0.395735415348252","0.137512063807119","0.431532531265841","0.149951019476119","0.508973644973226","0.65691135723615","0.387235095873449","0.713423888703782","0.535629809917317","0.00510405548026042","421","129","8","full","5.82218160888712e-05"
 "aclew","(6,12]","voc_dur_fem_ph","1.36841010946693","-0.558179506390883","0.297168936020881","-1.87832387148185","0.533247479155375","0.530525754437056","0.395735415348252","0.137512063807119","0.431532531265841","0.149951019476119","0.508973644973226","0.65691135723615","0.387235095873449","0.713423888703782","0.535629809917317","0.00510405548026042","421","129","8","full","5.82218160888712e-05"
+"aclew","(6,12]","simple_CTC_ph","1.49017116479248","1.00091278187782","0.277318847782271","3.60924902826532","0.542144677718745","0.532259685678796","0.48663452182975","0.0555101558889959","0.476972709090719","0.0544080377546364","0.448764901879478","0.690632108354889","0.233255305951733","0.669899172920431","0.550492811348392","0.0182331256695963","423","126","8","full","0.328782486083323"
 "aclew","(12,18]","wc_adu_ph","1.42151719731201","0.134772171258519","0.324971468731596","0.414720011527631","0.439152268892994","0.438997097693069","0.424505045396406","0.014647223496586","0.424324275675242","0.0146409861749427","0.560608901700696","0.651401777457847","0.120999942871651","0.748738206385046","0.439350440282681","0.000353342589611908","318","97","7","full","0.0865983789533906"
 "aclew","(12,18]","wc_adu_ph","1.42151719731201","0.134772171258519","0.324971468731596","0.414720011527631","0.439152268892994","0.438997097693069","0.424505045396406","0.014647223496586","0.424324275675242","0.0146409861749427","0.560608901700696","0.651401777457847","0.120999942871651","0.748738206385046","0.439350440282681","0.000353342589611908","318","97","7","full","0.0865983789533906"
 "aclew","(12,18]","sc_fem_ph","1.40193391309404","-0.124826896885852","0.305259843752003","-0.408920136207837","0.518235107932791","0.518081950612284","0.462107948921316","0.0561271590114778","0.466958409180625","0.0567162909554069","0.486821679055524","0.683343551356582","0.238151823330007","0.6977260773796","0.518377486978237","0.00029553636595318","320","97","7","full","0.0974203644547518"
 "aclew","(12,18]","sc_fem_ph","1.40193391309404","-0.124826896885852","0.305259843752003","-0.408920136207837","0.518235107932791","0.518081950612284","0.462107948921316","0.0561271590114778","0.466958409180625","0.0567162909554069","0.486821679055524","0.683343551356582","0.238151823330007","0.6977260773796","0.518377486978237","0.00029553636595318","320","97","7","full","0.0974203644547518"
 "aclew","(12,18]","sc_mal_ph","1.5143442388185","-0.0199368474958357","0.319806070488542","-0.0623404285771681","0.440568639893391","0.440565140152698","0.440568639893391",NA,"0.433004067225583",NA,"0.549825912071993","0.658030445515694",NA,"0.741502469363382","0.440573083842685","7.94368998734275e-06","317","97",NA,"no_exp","1.92777018680379e-05"
 "aclew","(12,18]","sc_mal_ph","1.5143442388185","-0.0199368474958357","0.319806070488542","-0.0623404285771681","0.440568639893391","0.440565140152698","0.440568639893391",NA,"0.433004067225583",NA,"0.549825912071993","0.658030445515694",NA,"0.741502469363382","0.440573083842685","7.94368998734275e-06","317","97",NA,"no_exp","1.92777018680379e-05"
@@ -105,8 +103,6 @@
 "aclew","(12,18]","cp_dur","1.52746140606514","0.907871644452487","0.288571096053655","3.14609348222347","0.599368505108239","0.59072041961339","0.504168462600494","0.0952000425077418","0.549316942393987","0.103725242940412","0.436508199393388","0.741159188294922","0.322064035465639","0.660687671591795","0.605149081481914","0.0144286618685243","324","97","7","full","0.0597174731709935"
 "aclew","(12,18]","cp_dur","1.52746140606514","0.907871644452487","0.288571096053655","3.14609348222347","0.599368505108239","0.59072041961339","0.504168462600494","0.0952000425077418","0.549316942393987","0.103725242940412","0.436508199393388","0.741159188294922","0.322064035465639","0.660687671591795","0.605149081481914","0.0144286618685243","324","97","7","full","0.0597174731709935"
 "aclew","(12,18]","avg_can_voc_dur_chi","1.2059237571317","0.601434927941595","0.314179753077826","1.91430199447834","0.497664157385849","0.494308208275771","0.497664157385849",NA,"0.507205231350837",NA,"0.511966480783519","0.71218342535532",NA,"0.715518330152009","0.501051609544021","0.00674340126824952","317","96",NA,"no_exp","0.0129944137966741"
 "aclew","(12,18]","avg_can_voc_dur_chi","1.2059237571317","0.601434927941595","0.314179753077826","1.91430199447834","0.497664157385849","0.494308208275771","0.497664157385849",NA,"0.507205231350837",NA,"0.511966480783519","0.71218342535532",NA,"0.715518330152009","0.501051609544021","0.00674340126824952","317","96",NA,"no_exp","0.0129944137966741"
 "aclew","(12,18]","can_voc_chi_ph","1.44475289184418","1.31238536557025","0.30290840946017","4.33261449528298","0.528403741660171","0.51151688146975","0.496757231442963","0.0316465102172091","0.500527034112377","0.0318866699796507","0.475175118839576","0.707479352428307","0.178568390202887","0.689329470456309","0.543475133955557","0.0319582524858064","316","96","7","full","6.106749624993e-05"
 "aclew","(12,18]","can_voc_chi_ph","1.44475289184418","1.31238536557025","0.30290840946017","4.33261449528298","0.528403741660171","0.51151688146975","0.496757231442963","0.0316465102172091","0.500527034112377","0.0318866699796507","0.475175118839576","0.707479352428307","0.178568390202887","0.689329470456309","0.543475133955557","0.0319582524858064","316","96","7","full","6.106749624993e-05"
-"aclew","(12,18]","voc_chi","1.34633362326521","1.11244501683936","0.292931709709946","3.79762579456106","0.632194339860896","0.61986921935701","0.317323731998121","0.314870607862774","0.382260587799818","0.379305458449678","0.443073094330389","0.618272260254185","0.615877795061389","0.665637359476156","0.639364997358752","0.0194957780017411","320","97","7","full","0.363837056389989"
-"aclew","(12,18]","simple_CTC","1.44906729751204","1.23990732661333","0.269269763030714","4.60470315217643","0.668012980593332","0.650885952475008","0.392495057920375","0.275517922672958","0.440410075269836","0.309152603616229","0.372515335556559","0.663633991948752","0.556014931109075","0.610340344034833","0.676524717912038","0.0256387654370301","321","97","7","full","0.0211675841829801"
 "aclew","(12,18]","peak_voc_chi","1.43380199199642","1.13967216546409","0.343591591387647","3.31693846424283","0.400023481443464","0.390697609918802","0.279012110856998","0.121011370586468","0.293232007675487","0.12717873442712","0.630554417706452","0.541509009782374","0.356621275903612","0.794074566842719","0.414010920155016","0.0233133102362138","318","96","7","full","0.148704270288972"
 "aclew","(12,18]","peak_voc_chi","1.43380199199642","1.13967216546409","0.343591591387647","3.31693846424283","0.400023481443464","0.390697609918802","0.279012110856998","0.121011370586468","0.293232007675487","0.12717873442712","0.630554417706452","0.541509009782374","0.356621275903612","0.794074566842719","0.414010920155016","0.0233133102362138","318","96","7","full","0.148704270288972"
 "aclew","(12,18]","voc_fem_ph","1.40201374055533","0.15076854607435","0.297395773407157","0.506962638866885","0.566848725349265","0.566614823581721","0.438327952110723","0.128520773238539","0.465917394221545","0.136610187605632","0.460414883917858","0.682581419481621","0.36960815413845","0.678538785861102","0.567027458835333","0.000412635253612755","321","97","7","full","0.169095369197986"
 "aclew","(12,18]","voc_fem_ph","1.40201374055533","0.15076854607435","0.297395773407157","0.506962638866885","0.566848725349265","0.566614823581721","0.438327952110723","0.128520773238539","0.465917394221545","0.136610187605632","0.460414883917858","0.682581419481621","0.36960815413845","0.678538785861102","0.567027458835333","0.000412635253612755","321","97","7","full","0.169095369197986"
 "aclew","(12,18]","peak_voc_fem_ph","1.4743056403547","0.329394920822745","0.35341170287352","0.932043048219682","0.355013198406702","0.354305829285139","0.25414619125277","0.100867007153932","0.26878864305851","0.106678387933476","0.682147256806554","0.518448303168706","0.326616576329916","0.825922064608129","0.356298344281027","0.00199251499588869","322","97","7","full","0.936319065440258"
 "aclew","(12,18]","peak_voc_fem_ph","1.4743056403547","0.329394920822745","0.35341170287352","0.932043048219682","0.355013198406702","0.354305829285139","0.25414619125277","0.100867007153932","0.26878864305851","0.106678387933476","0.682147256806554","0.518448303168706","0.326616576329916","0.825922064608129","0.356298344281027","0.00199251499588869","322","97","7","full","0.936319065440258"
@@ -125,6 +121,7 @@
 "aclew","(12,18]","avg_voc_dur_och","1.66356761150842","0.268866860690081","0.222796416741377","1.20678269705829","0.747023468500106","0.745983329481664","0.733880886701367","0.0131425817987422","0.735750712192303","0.0131760672524573","0.253621080194074","0.857759122476877","0.114787051763068","0.503608062082086","0.747375707448759","0.00139237796709449","322","97","7","full","0.00559967041430653"
 "aclew","(12,18]","avg_voc_dur_och","1.66356761150842","0.268866860690081","0.222796416741377","1.20678269705829","0.747023468500106","0.745983329481664","0.733880886701367","0.0131425817987422","0.735750712192303","0.0131760672524573","0.253621080194074","0.857759122476877","0.114787051763068","0.503608062082086","0.747375707448759","0.00139237796709449","322","97","7","full","0.00559967041430653"
 "aclew","(12,18]","avg_voc_dur_chi","1.35894593793081","0.66113854255764","0.293144411811152","2.25533394436172","0.558941801097897","0.55433418357098","0.558941801097898",NA,"0.563376782548526",NA,"0.444557820735603","0.750584294099287",NA,"0.666751693462868","0.562577649201689","0.0082434656307096","318","95",NA,"no_exp","0.423969347767402"
 "aclew","(12,18]","avg_voc_dur_chi","1.35894593793081","0.66113854255764","0.293144411811152","2.25533394436172","0.558941801097897","0.55433418357098","0.558941801097898",NA,"0.563376782548526",NA,"0.444557820735603","0.750584294099287",NA,"0.666751693462868","0.562577649201689","0.0082434656307096","318","95",NA,"no_exp","0.423969347767402"
 "aclew","(12,18]","voc_dur_fem_ph","1.53983347126136","-0.142240481581649","0.303614828832368","-0.468489902580428","0.540857968950069","0.540655553871196","0.438480026746928","0.102377942203139","0.454288518340392","0.106068967426526","0.47569544852691","0.674009286538688","0.325682310582761","0.689706784457649","0.541029801992686","0.000374248121490809","320","97","7","full","0.111126210443584"
 "aclew","(12,18]","voc_dur_fem_ph","1.53983347126136","-0.142240481581649","0.303614828832368","-0.468489902580428","0.540857968950069","0.540655553871196","0.438480026746928","0.102377942203139","0.454288518340392","0.106068967426526","0.47569544852691","0.674009286538688","0.325682310582761","0.689706784457649","0.541029801992686","0.000374248121490809","320","97","7","full","0.111126210443584"
+"aclew","(12,18]","simple_CTC_ph","1.39528614916253","1.54043897826065","0.293646602338183","5.24589409853473","0.540084526178782","0.515639881745927","0.439456038970794","0.100628487207986","0.42977121816244","0.0984108163139696","0.449779763861743","0.65556938470496","0.31370498292818","0.670656218834764","0.560900657139375","0.0452607753934478","319","97","7","full","0.0343495070557213"
 "aclew","(18,24]","wc_adu_ph","1.12621605575973","1.84022935041372","0.573131266479979","3.2108339887229","0.565171231344487","0.528976833834031","0.384129368427394","0.181041862917094","0.406907507858812","0.191777300338429","0.460613285891923","0.637893022268477","0.437923852214547","0.678684968075706","0.59301830569797","0.0640414718639395","94","53","5","full","0.236048506821997"
 "aclew","(18,24]","wc_adu_ph","1.12621605575973","1.84022935041372","0.573131266479979","3.2108339887229","0.565171231344487","0.528976833834031","0.384129368427394","0.181041862917094","0.406907507858812","0.191777300338429","0.460613285891923","0.637893022268477","0.437923852214547","0.678684968075706","0.59301830569797","0.0640414718639395","94","53","5","full","0.236048506821997"
 "aclew","(18,24]","sc_fem_ph","1.55260646372282","1.56620435508251","0.549164617483729","2.85197608370848","0.592137315832653","0.563305458234726","0.45246513977154","0.139672176061113","0.465375062167159","0.14365736032235","0.419499990863125","0.682184038340945","0.379021582924179","0.647688189534999","0.611996626359106","0.0486911681243802","93","52","5","full","0.480707129890182"
 "aclew","(18,24]","sc_fem_ph","1.55260646372282","1.56620435508251","0.549164617483729","2.85197608370848","0.592137315832653","0.563305458234726","0.45246513977154","0.139672176061113","0.465375062167159","0.14365736032235","0.419499990863125","0.682184038340945","0.379021582924179","0.647688189534999","0.611996626359106","0.0486911681243802","93","52","5","full","0.480707129890182"
 "aclew","(18,24]","sc_mal_ph","1.40784890183513","1.23222320795685","0.620015396375042","1.9874074340107","0.362164215530689","0.350060596848984","0.362164215530689",NA,"0.339600249952872",NA,"0.598096616247028","0.582752305832309",NA,"0.77336706436661","0.383480847008071","0.0334202501590871","95","52",NA,"no_exp","0.0120932355443674"
 "aclew","(18,24]","sc_mal_ph","1.40784890183513","1.23222320795685","0.620015396375042","1.9874074340107","0.362164215530689","0.350060596848984","0.362164215530689",NA,"0.339600249952872",NA,"0.598096616247028","0.582752305832309",NA,"0.77336706436661","0.383480847008071","0.0334202501590871","95","52",NA,"no_exp","0.0120932355443674"
@@ -147,8 +144,6 @@
 "aclew","(18,24]","cp_dur","1.47107387252174","1.59323696718432","0.604785301807024","2.63438440455468","0.368052414155344","0.347890456194641","0.314697326672477","0.053355087482868","0.292761813612363","0.0496360497945623","0.587898611329438","0.541074683950712","0.222791493990597","0.7667454671072","0.402670583114807","0.0547801269201657","97","53","5","full","0.747228484877589"
 "aclew","(18,24]","cp_dur","1.47107387252174","1.59323696718432","0.604785301807024","2.63438440455468","0.368052414155344","0.347890456194641","0.314697326672477","0.053355087482868","0.292761813612363","0.0496360497945623","0.587898611329438","0.541074683950712","0.222791493990597","0.7667454671072","0.402670583114807","0.0547801269201657","97","53","5","full","0.747228484877589"
 "aclew","(18,24]","avg_can_voc_dur_chi","1.37196413228695","0.464477739813145","0.566688383330718","0.819635188360791","0.588454872501294","0.585953201224308","0.524066154162787","0.0643887183385067","0.573536266604277","0.070466800486853","0.450393627006621","0.757321772171035","0.265455835284992","0.671113721366671","0.590204455473173","0.00425125424886536","95","53","5","full","0.34390986816193"
 "aclew","(18,24]","avg_can_voc_dur_chi","1.37196413228695","0.464477739813145","0.566688383330718","0.819635188360791","0.588454872501294","0.585953201224308","0.524066154162787","0.0643887183385067","0.573536266604277","0.070466800486853","0.450393627006621","0.757321772171035","0.265455835284992","0.671113721366671","0.590204455473173","0.00425125424886536","95","53","5","full","0.34390986816193"
 "aclew","(18,24]","can_voc_chi_ph","1.52826717656485","2.04515215659523","0.535643509366419","3.81812179338143","0.549425971332904","0.500248009505366","0.468093475134591","0.0813324961983142","0.417247705300122","0.0724979073791189","0.401631275623145","0.645947138162343","0.269254354429262","0.633743856477635","0.589755903914203","0.0895078944088364","93","52","5","full","0.885058725589044"
 "aclew","(18,24]","can_voc_chi_ph","1.52826717656485","2.04515215659523","0.535643509366419","3.81812179338143","0.549425971332904","0.500248009505366","0.468093475134591","0.0813324961983142","0.417247705300122","0.0724979073791189","0.401631275623145","0.645947138162343","0.269254354429262","0.633743856477635","0.589755903914203","0.0895078944088364","93","52","5","full","0.885058725589044"
-"aclew","(18,24]","voc_chi","1.24224620548598","1.87722301591185","0.602430704075409","3.11608124090047","0.306759854180939","0.28392992823472","0.0947767390833451","0.211983115097594","0.0903739705660513","0.202135629370861","0.661036295818985","0.300622638146317","0.449594961460714","0.813041386289151","0.358352723900652","0.0744227956659324","96","53","5","full","0.809291188899549"
-"aclew","(18,24]","simple_CTC","1.2939671877247","2.40920461105436","0.558350784117299","4.31485847174565","0.345833876538208","0.301623477089437","0.126124801884335","0.219709074653873","0.1076430641546","0.187513935918832","0.558307683687305","0.328090024466761","0.433028793406203","0.747199895401027","0.429460575904962","0.127837098815525","97","53","5","full","0.854537695959238"
 "aclew","(18,24]","peak_voc_chi","1.27288574642999","1.64853305191667","0.665897059434901","2.4756575037524","0.19490889187073","0.183927422086995","0.126122042057288","0.0687868498134414","0.122847641547847","0.0670009946813965","0.784189204769605","0.350496278935807","0.258845503498509","0.885544580904657","0.240268975714102","0.0563415536271067","94","52","5","full","0.116521589564632"
 "aclew","(18,24]","peak_voc_chi","1.27288574642999","1.64853305191667","0.665897059434901","2.4756575037524","0.19490889187073","0.183927422086995","0.126122042057288","0.0687868498134414","0.122847641547847","0.0670009946813965","0.784189204769605","0.350496278935807","0.258845503498509","0.885544580904657","0.240268975714102","0.0563415536271067","94","52","5","full","0.116521589564632"
 "aclew","(18,24]","voc_fem_ph","1.54125637918678","2.21324336093544","0.557832940603443","3.96757380182897","0.513785304294401","0.462115901510854","0.396406703208048","0.117378601086353","0.371746140045823","0.110076448063818","0.455967154186208","0.609709881866632","0.331777708810912","0.675253399981228","0.56268203750516","0.100566135994306","94","52","5","full","0.730097197390139"
 "aclew","(18,24]","voc_fem_ph","1.54125637918678","2.21324336093544","0.557832940603443","3.96757380182897","0.513785304294401","0.462115901510854","0.396406703208048","0.117378601086353","0.371746140045823","0.110076448063818","0.455967154186208","0.609709881866632","0.331777708810912","0.675253399981228","0.56268203750516","0.100566135994306","94","52","5","full","0.730097197390139"
 "aclew","(18,24]","peak_voc_fem_ph","1.3361655029135",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","(18,24]","peak_voc_fem_ph","1.3361655029135",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
@@ -167,6 +162,7 @@
 "aclew","(18,24]","avg_voc_dur_och","1.60444418159038","0.39376515545097","0.527590136365116","0.746346696630558","0.596259361758761","0.594284269873594","0.596259356753228","5.0055333706568e-09","0.598034589793415","5.02043626169357e-09","0.404942688511066","0.773326961765471","7.08550369535827e-05","0.636351073316503","0.597596740942125","0.00331247106853087","98","53","5","full","0.647455561602978"
 "aclew","(18,24]","avg_voc_dur_och","1.60444418159038","0.39376515545097","0.527590136365116","0.746346696630558","0.596259361758761","0.594284269873594","0.596259356753228","5.0055333706568e-09","0.598034589793415","5.02043626169357e-09","0.404942688511066","0.773326961765471","7.08550369535827e-05","0.636351073316503","0.597596740942125","0.00331247106853087","98","53","5","full","0.647455561602978"
 "aclew","(18,24]","avg_voc_dur_chi","1.29498812774512","0.83377456889175","0.46693492370475","1.78563334324284","0.716807296242729","0.706206934215706","0.655527101986705","0.061280194256026","0.66061769671435","0.0617560748608757","0.285391879474468","0.812783917603166","0.248507695777969","0.534220815276294","0.720995235175514","0.0147883009598071","96","53","5","full","0.555843147147796"
 "aclew","(18,24]","avg_voc_dur_chi","1.29498812774512","0.83377456889175","0.46693492370475","1.78563334324284","0.716807296242729","0.706206934215706","0.655527101986705","0.061280194256026","0.66061769671435","0.0617560748608757","0.285391879474468","0.812783917603166","0.248507695777969","0.534220815276294","0.720995235175514","0.0147883009598071","96","53","5","full","0.555843147147796"
 "aclew","(18,24]","voc_dur_fem_ph","1.56169060724043","1.33133515570688","0.54104534303166","2.46067205429947","0.612856277749936","0.591381796915488","0.481388323693596","0.13146795405634","0.501501623144143","0.136960929681085","0.403319306976069","0.708167793071771","0.370082328247493","0.635074253120112","0.626421791795348","0.0350399948798593","95","53","5","full","0.844433303605004"
 "aclew","(18,24]","voc_dur_fem_ph","1.56169060724043","1.33133515570688","0.54104534303166","2.46067205429947","0.612856277749936","0.591381796915488","0.481388323693596","0.13146795405634","0.501501623144143","0.136960929681085","0.403319306976069","0.708167793071771","0.370082328247493","0.635074253120112","0.626421791795348","0.0350399948798593","95","53","5","full","0.844433303605004"
+"aclew","(18,24]","simple_CTC_ph","1.64635541891938","2.53889216795642","0.509781568388213","4.98035300880666","0.524618012565487","0.448670459233041","0.524618012565486",NA,"0.430475421910897",NA,"0.390074791006473","0.656106258094599",NA,"0.624559677698195","0.593437797588518","0.144767338355477","97","52",NA,"no_exp","0.71182673251912"
 "aclew","(24,30]","wc_adu_ph","1.65123876441033","0.397843531196865","0.606318417526898","0.656162702132029","0.235685707891747","0.234783695066909","0.201932816760795","0.0337528911309522","0.207328834392469","0.0346548306897825","0.784738180916984","0.455333761533744","0.186158079840179","0.885854491955075","0.238610880147018","0.00382718508010806","95","40","3","full","0.162753571865192"
 "aclew","(24,30]","wc_adu_ph","1.65123876441033","0.397843531196865","0.606318417526898","0.656162702132029","0.235685707891747","0.234783695066909","0.201932816760795","0.0337528911309522","0.207328834392469","0.0346548306897825","0.784738180916984","0.455333761533744","0.186158079840179","0.885854491955075","0.238610880147018","0.00382718508010806","95","40","3","full","0.162753571865192"
 "aclew","(24,30]","sc_fem_ph","1.31802637896172","-0.327281123747586","0.554978286763134","-0.589718790002447","0.394046600334559","0.393034396088249","0.394046600334559",NA,"0.408436818194306",NA,"0.628082258096491","0.639090618139795",NA,"0.792516408723814","0.395603138580763","0.00256874249251419","95","40",NA,"no_exp","0.492489224990329"
 "aclew","(24,30]","sc_fem_ph","1.31802637896172","-0.327281123747586","0.554978286763134","-0.589718790002447","0.394046600334559","0.393034396088249","0.394046600334559",NA,"0.408436818194306",NA,"0.628082258096491","0.639090618139795",NA,"0.792516408723814","0.395603138580763","0.00256874249251419","95","40",NA,"no_exp","0.492489224990329"
 "aclew","(24,30]","sc_mal_ph","1.25989810951226","1.69170154480088","0.583765720883321","2.89791175514912","0.187018146414813","0.173465909530883","0.175528672598765","0.0114894738160487","0.165701467732532","0.0108462204300128","0.767465989370945","0.407064451570672","0.10414518918324","0.876051362290445","0.245930732563997","0.0724648230331136","95","40","3","full","0.0360175964051287"
 "aclew","(24,30]","sc_mal_ph","1.25989810951226","1.69170154480088","0.583765720883321","2.89791175514912","0.187018146414813","0.173465909530883","0.175528672598765","0.0114894738160487","0.165701467732532","0.0108462204300128","0.767465989370945","0.407064451570672","0.10414518918324","0.876051362290445","0.245930732563997","0.0724648230331136","95","40","3","full","0.0360175964051287"
@@ -189,8 +185,6 @@
 "aclew","(24,30]","cp_dur","1.25557131369927","0.550213054885223","0.558179726127916","0.985727408449679","0.406304911074039","0.403365595332628","0.364544758037764","0.0417601530362758","0.381795954420068","0.0437363509793258","0.621790268857777","0.617896394567947","0.209132376688369","0.788536789793461","0.410599856256626","0.0072342609239978","92","39","3","full","0.0625888456659654"
 "aclew","(24,30]","cp_dur","1.25557131369927","0.550213054885223","0.558179726127916","0.985727408449679","0.406304911074039","0.403365595332628","0.364544758037764","0.0417601530362758","0.381795954420068","0.0437363509793258","0.621790268857777","0.617896394567947","0.209132376688369","0.788536789793461","0.410599856256626","0.0072342609239978","92","39","3","full","0.0625888456659654"
 "aclew","(24,30]","avg_can_voc_dur_chi","1.64462763090678","0.569744401172101","0.358782183016892","1.58799524653451","0.769793609010213","0.764039611451084","0.685223331634427","0.0845702773757871","0.743941949893713","0.0918173304226616","0.249933391763586","0.86252069534227","0.303013746260234","0.499933387326338","0.771514339081685","0.00747472763060139","96","40","3","full","0.644019671350751"
 "aclew","(24,30]","avg_can_voc_dur_chi","1.64462763090678","0.569744401172101","0.358782183016892","1.58799524653451","0.769793609010213","0.764039611451084","0.685223331634427","0.0845702773757871","0.743941949893713","0.0918173304226616","0.249933391763586","0.86252069534227","0.303013746260234","0.499933387326338","0.771514339081685","0.00747472763060139","96","40","3","full","0.644019671350751"
 "aclew","(24,30]","can_voc_chi_ph","1.35067132847877","0.782526752607085","0.552310396915985","1.41682422959371","0.451999744700293","0.445335830818549","0.451999699849174","4.48511185799273e-08","0.464424736724784","4.60840326779985e-08","0.563064255081599","0.681487150814147","0.000214671918699206","0.750376075765745","0.460079011450569","0.0147431806320202","89","39","3","full","0.873142176229854"
 "aclew","(24,30]","can_voc_chi_ph","1.35067132847877","0.782526752607085","0.552310396915985","1.41682422959371","0.451999744700293","0.445335830818549","0.451999699849174","4.48511185799273e-08","0.464424736724784","4.60840326779985e-08","0.563064255081599","0.681487150814147","0.000214671918699206","0.750376075765745","0.460079011450569","0.0147431806320202","89","39","3","full","0.873142176229854"
-"aclew","(24,30]","voc_chi","1.39162160223749","-0.691742013231744","0.532385483864299","-1.2993254590842","0.485102092860535","0.479657718966485","0.388993739318046","0.0961083535424881","0.415462676841379","0.102648011506768","0.549933947973598","0.644563943175057","0.320387283622132","0.741575315105349","0.490880869668528","0.0112231507020431","92","40","3","full","0.573874471512722"
-"aclew","(24,30]","simple_CTC","1.36324585008309","-0.599713674592443","0.541939484636978","-1.10660634922027","0.485414569530313","0.48129368333765","0.390410088188845","0.0950044813414682","0.415505219550127","0.101111264980782","0.547662416349191","0.64459694348494","0.31797997575442","0.740042172007239","0.489783099295335","0.00848941595768483","90","39","3","full","0.257420271236441"
 "aclew","(24,30]","peak_voc_chi","1.09627677782787","0.553268562524171","0.533098600741734","1.03783533056431","0.407252611912007","0.404114121850747","0.391995510252863","0.0152571016591439","0.398165834172037","0.0154972606835265","0.602077707673511","0.631003830552587","0.124487994134079","0.77593666473077","0.411820616467258","0.00770649461651149","95","40","3","full","0.856913620719912"
 "aclew","(24,30]","peak_voc_chi","1.09627677782787","0.553268562524171","0.533098600741734","1.03783533056431","0.407252611912007","0.404114121850747","0.391995510252863","0.0152571016591439","0.398165834172037","0.0154972606835265","0.602077707673511","0.631003830552587","0.124487994134079","0.77593666473077","0.411820616467258","0.00770649461651149","95","40","3","full","0.856913620719912"
 "aclew","(24,30]","voc_fem_ph","1.60258359307937","-0.140262026392732","0.562905273717623","-0.249175186202099","0.354119489100855","0.35395050898923","0.325972222236083","0.0281472668647714","0.338351676123046","0.0292162162059337","0.670409128541212","0.581680046179208","0.170927517404114","0.818785154079635","0.354427692868757","0.000477183879526328","96","40","3","full","0.104986746342325"
 "aclew","(24,30]","voc_fem_ph","1.60258359307937","-0.140262026392732","0.562905273717623","-0.249175186202099","0.354119489100855","0.35395050898923","0.325972222236083","0.0281472668647714","0.338351676123046","0.0292162162059337","0.670409128541212","0.581680046179208","0.170927517404114","0.818785154079635","0.354427692868757","0.000477183879526328","96","40","3","full","0.104986746342325"
 "aclew","(24,30]","peak_voc_fem_ph","1.33870288547755","-0.675401248735991","0.599336931643433","-1.12691411637855","0.219836749069366","0.217340933053841","0.219836749069366",NA,"0.222203523998201",NA,"0.788562532809198","0.471384687912326",NA,"0.888010435079002","0.228693975828039","0.0113530427741983","95","40",NA,"no_exp","0.809856824888098"
 "aclew","(24,30]","peak_voc_fem_ph","1.33870288547755","-0.675401248735991","0.599336931643433","-1.12691411637855","0.219836749069366","0.217340933053841","0.219836749069366",NA,"0.222203523998201",NA,"0.788562532809198","0.471384687912326",NA,"0.888010435079002","0.228693975828039","0.0113530427741983","95","40",NA,"no_exp","0.809856824888098"
@@ -209,6 +203,7 @@
 "aclew","(24,30]","avg_voc_dur_och","1.26214613737006","0.214339029862778","0.474418721059901","0.451792942285082","0.557026611948585","0.556388411125999","0.557026611948585",NA,"0.563379854787881",NA,"0.448025781321804","0.750586340661673",NA,"0.669347280058568","0.557534138832533","0.00114572770653462","95","40",NA,"no_exp","0.598568469735269"
 "aclew","(24,30]","avg_voc_dur_och","1.26214613737006","0.214339029862778","0.474418721059901","0.451792942285082","0.557026611948585","0.556388411125999","0.557026611948585",NA,"0.563379854787881",NA,"0.448025781321804","0.750586340661673",NA,"0.669347280058568","0.557534138832533","0.00114572770653462","95","40",NA,"no_exp","0.598568469735269"
 "aclew","(24,30]","avg_voc_dur_chi","1.29986549202782","0.150359826192921","0.402717010172396","0.373363484518707","0.709644075941706","0.709255116725839","0.668912559916398","0.0407315160253101","0.6934383219784","0.0422249421176326","0.301001860064693","0.832729441042167","0.205487085038531","0.548636364147231","0.709803221373019","0.000548104647179651","93","39","3","full","0.613652405196337"
 "aclew","(24,30]","avg_voc_dur_chi","1.29986549202782","0.150359826192921","0.402717010172396","0.373363484518707","0.709644075941706","0.709255116725839","0.668912559916398","0.0407315160253101","0.6934383219784","0.0422249421176326","0.301001860064693","0.832729441042167","0.205487085038531","0.548636364147231","0.709803221373019","0.000548104647179651","93","39","3","full","0.613652405196337"
 "aclew","(24,30]","voc_dur_fem_ph","1.19337322606655","-0.588497488872031","0.518297823241706","-1.13544271745395","0.482489205046396","0.478564941028322","0.482489205046397",NA,"0.513286761414556",NA,"0.550543799033315","0.716440340443331",NA,"0.741986387363889","0.486698312670693","0.00813337164237038","96","40",NA,"no_exp","0.672058337576089"
 "aclew","(24,30]","voc_dur_fem_ph","1.19337322606655","-0.588497488872031","0.518297823241706","-1.13544271745395","0.482489205046396","0.478564941028322","0.482489205046397",NA,"0.513286761414556",NA,"0.550543799033315","0.716440340443331",NA,"0.741986387363889","0.486698312670693","0.00813337164237038","96","40",NA,"no_exp","0.672058337576089"
+"aclew","(24,30]","simple_CTC_ph","1.46500446310646","-0.0946713375371783","0.479876022652713","-0.197282908643452","0.547140805050236","0.54701917044407","0.547140805050237",NA,"0.556908256222515",NA,"0.460943549166742","0.746262860004781",NA,"0.678928235652887","0.547241479957532","0.00022230951346206","95","40",NA,"no_exp","0.801446748658085"
 "aclew","(30,36]","wc_adu_ph","1.42070374234841","-0.0753944142583192","0.783918996352435","-0.096176281744834","0.416600838512297","0.416545045418731","0.278394032398264","0.138206806114033","0.295063893363656","0.146482444146015","0.618332320167677","0.543197839984343","0.382730249844476","0.786341096578118","0.416678970001709","0.000133924582977817","67","21","5","full","0.893946514331741"
 "aclew","(30,36]","wc_adu_ph","1.42070374234841","-0.0753944142583192","0.783918996352435","-0.096176281744834","0.416600838512297","0.416545045418731","0.278394032398264","0.138206806114033","0.295063893363656","0.146482444146015","0.618332320167677","0.543197839984343","0.382730249844476","0.786341096578118","0.416678970001709","0.000133924582977817","67","21","5","full","0.893946514331741"
 "aclew","(30,36]","sc_fem_ph","1.47020785924377","0.198559776987279","0.786344908453044","0.25250977637523","0.308076959909138","0.307791889564064","0.276517022188979","0.0315599377201583","0.286331934150172","0.0326801508910218","0.716482698909157","0.535099929125553","0.180776521957421","0.846453010455487","0.308717211422468","0.000925321858404238","69","21","5","full","0.635734774584546"
 "aclew","(30,36]","sc_fem_ph","1.47020785924377","0.198559776987279","0.786344908453044","0.25250977637523","0.308076959909138","0.307791889564064","0.276517022188979","0.0315599377201583","0.286331934150172","0.0326801508910218","0.716482698909157","0.535099929125553","0.180776521957421","0.846453010455487","0.308717211422468","0.000925321858404238","69","21","5","full","0.635734774584546"
 "aclew","(30,36]","sc_mal_ph","1.44308069549247","0.581152333899573","0.698740960120466","0.831713563491942","0.582937766402953","0.578086954086191","0.572742983329553","0.0101947830734","0.572197718144229","0.0101850773931147","0.416665180254251","0.75643751767362","0.100921144430267","0.64549607299677","0.586408275153951","0.00832132106776011","68","20","5","full","0.994462262135741"
 "aclew","(30,36]","sc_mal_ph","1.44308069549247","0.581152333899573","0.698740960120466","0.831713563491942","0.582937766402953","0.578086954086191","0.572742983329553","0.0101947830734","0.572197718144229","0.0101850773931147","0.416665180254251","0.75643751767362","0.100921144430267","0.64549607299677","0.586408275153951","0.00832132106776011","68","20","5","full","0.994462262135741"
@@ -231,8 +226,6 @@
 "aclew","(30,36]","cp_dur","1.40606250785618","0.843048603656228","0.66445827134427","1.26877584344108","0.63657910821875","0.626969993797427","0.481564473332347","0.155014634886403","0.550812514485644","0.17730543998192","0.415680114094496","0.742167443698283","0.42107652509006","0.644732591152716","0.642064919624023","0.0150949258265958","73","21","5","full","0.565976229020591"
 "aclew","(30,36]","cp_dur","1.40606250785618","0.843048603656228","0.66445827134427","1.26877584344108","0.63657910821875","0.626969993797427","0.481564473332347","0.155014634886403","0.550812514485644","0.17730543998192","0.415680114094496","0.742167443698283","0.42107652509006","0.644732591152716","0.642064919624023","0.0150949258265958","73","21","5","full","0.565976229020591"
 "aclew","(30,36]","avg_can_voc_dur_chi","1.28167893580779","-0.806012816606333","0.573673722028521","-1.40500215655034","0.811752075141132","0.800955173075593","0.811752075141133",NA,"0.934897579866246",NA,"0.216805764660103","0.966901018649917",NA,"0.465624059365604","0.814255911559892","0.0133007384842984","69","21",NA,"no_exp","0.389211609514178"
 "aclew","(30,36]","avg_can_voc_dur_chi","1.28167893580779","-0.806012816606333","0.573673722028521","-1.40500215655034","0.811752075141132","0.800955173075593","0.811752075141133",NA,"0.934897579866246",NA,"0.216805764660103","0.966901018649917",NA,"0.465624059365604","0.814255911559892","0.0133007384842984","69","21",NA,"no_exp","0.389211609514178"
 "aclew","(30,36]","can_voc_chi_ph","1.68337954762225","0.672251100916553","0.682381237922893","0.985154725183864","0.610508127046806","0.604234772451052","0.369714606416311","0.240793520630495","0.397609192514952","0.25896114364742","0.418878633433466","0.630562599996981","0.508882249294884","0.647208338507366","0.614510400764306","0.0102756283132543","69","21","5","full","0.692721218865462"
 "aclew","(30,36]","can_voc_chi_ph","1.68337954762225","0.672251100916553","0.682381237922893","0.985154725183864","0.610508127046806","0.604234772451052","0.369714606416311","0.240793520630495","0.397609192514952","0.25896114364742","0.418878633433466","0.630562599996981","0.508882249294884","0.647208338507366","0.614510400764306","0.0102756283132543","69","21","5","full","0.692721218865462"
-"aclew","(30,36]","voc_chi","1.28277576269686","-0.0524886465288789","0.758729348612739","-0.0691796707545966","0.424160738022748","0.424135331770395","0.251268853889649","0.172891884133099","0.281835620656529","0.193924120386717","0.645889903525533","0.530881927227259","0.440368164592671","0.803672758979383","0.424195229469723","5.98976993287457e-05","72","21","5","full","0.1856335917908"
-"aclew","(30,36]","simple_CTC","1.38211609852897","0.263705624505007","0.753067868853634","0.350175110918536","0.427330175500057","0.42664651833178","0.247449734710198","0.179880440789859","0.266531098143272","0.193751395508129","0.61682958511248","0.516266499148717","0.440172006729334","0.78538499165217","0.42824635192059","0.00159983358881011","70","21","5","full","0.472822878986133"
 "aclew","(30,36]","peak_voc_chi","1.14118912216386","-0.627268107107276","0.839570388721547","-0.747129860144838","0.383035190847552","0.379908529419341","0.281412542587623","0.10162264825993","0.308552592171095","0.111423361786121","0.676466263343819","0.555475104906687","0.33380138074328","0.822475691643114","0.388071386261014","0.00816285684167242","62","20","5","full","0.987680833430155"
 "aclew","(30,36]","peak_voc_chi","1.14118912216386","-0.627268107107276","0.839570388721547","-0.747129860144838","0.383035190847552","0.379908529419341","0.281412542587623","0.10162264825993","0.308552592171095","0.111423361786121","0.676466263343819","0.555475104906687","0.33380138074328","0.822475691643114","0.388071386261014","0.00816285684167242","62","20","5","full","0.987680833430155"
 "aclew","(30,36]","voc_fem_ph","1.55969470614515","0.0867272894736483","0.737770731789707","0.117553171651663","0.506907474557115","0.506827602661493","0.22295592420342","0.283951550353695","0.256439022409843","0.326594856111671","0.567144226527954","0.50639808689394","0.571484782047319","0.753089786498233","0.506985169672498","0.000157567011005649","71","21","5","full","0.37156773067175"
 "aclew","(30,36]","voc_fem_ph","1.55969470614515","0.0867272894736483","0.737770731789707","0.117553171651663","0.506907474557115","0.506827602661493","0.22295592420342","0.283951550353695","0.256439022409843","0.326594856111671","0.567144226527954","0.50639808689394","0.571484782047319","0.753089786498233","0.506985169672498","0.000157567011005649","71","21","5","full","0.37156773067175"
 "aclew","(30,36]","peak_voc_fem_ph","1.33252785002667","-0.712698417971128","0.892296020353274","-0.798724192100464","0.199805324628092","0.197607714235296","0.199805324628092",NA,"0.205116525497219",NA,"0.821465353033863","0.452897919510809",NA,"0.906347258523941","0.208606472135699","0.0109987579004029","60","20",NA,"no_exp","0.716172103916502"
 "aclew","(30,36]","peak_voc_fem_ph","1.33252785002667","-0.712698417971128","0.892296020353274","-0.798724192100464","0.199805324628092","0.197607714235296","0.199805324628092",NA,"0.205116525497219",NA,"0.821465353033863","0.452897919510809",NA,"0.906347258523941","0.208606472135699","0.0109987579004029","60","20",NA,"no_exp","0.716172103916502"
@@ -251,9 +244,9 @@
 "aclew","(30,36]","avg_voc_dur_och","1.45417791573291","0.0870238958357026","0.686428508116784","0.12677779959118","0.637886195611928","0.63778841665676","0.552387939400112","0.0854982562118161","0.652078904252431","0.100928360757913","0.427465474782966","0.807514027279051","0.317692242206059","0.653808438904674","0.637941702549825","0.000153285893065438","69","21","5","full","0.635707433846653"
 "aclew","(30,36]","avg_voc_dur_och","1.45417791573291","0.0870238958357026","0.686428508116784","0.12677779959118","0.637886195611928","0.63778841665676","0.552387939400112","0.0854982562118161","0.652078904252431","0.100928360757913","0.427465474782966","0.807514027279051","0.317692242206059","0.653808438904674","0.637941702549825","0.000153285893065438","69","21","5","full","0.635707433846653"
 "aclew","(30,36]","avg_voc_dur_chi","1.24481083816558","0.35777125654112","0.497640765853115","0.718934784066146","0.819711832253229","0.817320647865393","0.819711832253229",NA,"0.866898396412829",NA,"0.190666423689735","0.931073786771397",NA,"0.436653665608952","0.820237751527619","0.00291710366222637","72","21",NA,"no_exp","0.096502010623752"
 "aclew","(30,36]","avg_voc_dur_chi","1.24481083816558","0.35777125654112","0.497640765853115","0.718934784066146","0.819711832253229","0.817320647865393","0.819711832253229",NA,"0.866898396412829",NA,"0.190666423689735","0.931073786771397",NA,"0.436653665608952","0.820237751527619","0.00291710366222637","72","21",NA,"no_exp","0.096502010623752"
 "aclew","(30,36]","voc_dur_fem_ph","1.46094053748655","0.390776915036555","0.779672952502557","0.501206196498491","0.258101104922043","0.257183859612824","0.258101104922042",NA,"0.262849822279853",NA,"0.755548848889126","0.512688816222719",NA,"0.869223129518034","0.260737681319615","0.00355382170679033","72","21",NA,"no_exp","0.885073072917312"
 "aclew","(30,36]","voc_dur_fem_ph","1.46094053748655","0.390776915036555","0.779672952502557","0.501206196498491","0.258101104922043","0.257183859612824","0.258101104922042",NA,"0.262849822279853",NA,"0.755548848889126","0.512688816222719",NA,"0.869223129518034","0.260737681319615","0.00355382170679033","72","21",NA,"no_exp","0.885073072917312"
+"aclew","(30,36]","simple_CTC_ph","1.3360986217063","-0.241647768753358","0.776239434557962","-0.311305710577518","0.56269464561884","0.562076740404067","0.251211152911109","0.311483492707731","0.308572433803725","0.382607293986344","0.537159182437029","0.555492964675274","0.618552579807363","0.732911442424683","0.563174858574524","0.00109811817045765","66","20","5","full","0.382266520982046"
 "lena","(0,6]","voc_fem_ph","1.24052296788298","-1.82071260666917","0.629659402946098","-2.89158328796534","0.479883159486207","0.448896142141132","0.341058910379575","0.138824249106631","0.399520804806503","0.162620515230091","0.609271572715172","0.632076581441287","0.40326234045605","0.78055850050792","0.513468146247822","0.0645720041066902","128","64","6","full","0.809338541194608"
 "lena","(0,6]","voc_fem_ph","1.24052296788298","-1.82071260666917","0.629659402946098","-2.89158328796534","0.479883159486207","0.448896142141132","0.341058910379575","0.138824249106631","0.399520804806503","0.162620515230091","0.609271572715172","0.632076581441287","0.40326234045605","0.78055850050792","0.513468146247822","0.0645720041066902","128","64","6","full","0.809338541194608"
 "lena","(0,6]","peak_lena_CVC","1.38267049250479","-1.03373778240225","0.616134309925111","-1.67777993491045","0.336004565529921","0.327009654993592","0.296448445215181","0.0395561203147395","0.284298072881475","0.0379348549727941","0.636780612173284","0.533196092335151","0.194768721751708","0.797985345838684","0.353779858315511","0.0267702033219183","127","63","6","full","5.64711840890698e-05"
 "lena","(0,6]","peak_lena_CVC","1.38267049250479","-1.03373778240225","0.616134309925111","-1.67777993491045","0.336004565529921","0.327009654993592","0.296448445215181","0.0395561203147395","0.284298072881475","0.0379348549727941","0.636780612173284","0.533196092335151","0.194768721751708","0.797985345838684","0.353779858315511","0.0267702033219183","127","63","6","full","5.64711840890698e-05"
-"lena","(0,6]","lena_CVC","1.37046914124075","-0.506502969658111","0.374876250050149","-1.35112045532454","0.79019334463567","0.78499561989352","0.639592157742169","0.150601186893499","0.610335302990078","0.143712238995843","0.200209472585096","0.781239593844346","0.379093971194271","0.447447731679462","0.791573408453036","0.0065777885595156","128","63","6","full","0.00776754054898409"
 "lena","(0,6]","lp_dur","1.40988574622447","0.67008453903333","0.666327133083569","1.00563898085971","0.321628465865519","0.318419116127167","0.280212754799449","0.0414157110660708","0.306594309491915","0.0453149298842825","0.74223906130108","0.553709589488854","0.212873037006293","0.861532971685402","0.328397554228767","0.00997843810160051","125","63","6","full","0.0975943340727147"
 "lena","(0,6]","lp_dur","1.40988574622447","0.67008453903333","0.666327133083569","1.00563898085971","0.321628465865519","0.318419116127167","0.280212754799449","0.0414157110660708","0.306594309491915","0.0453149298842825","0.74223906130108","0.553709589488854","0.212873037006293","0.861532971685402","0.328397554228767","0.00997843810160051","125","63","6","full","0.0975943340727147"
 "lena","(0,6]","lp_n","1.51878098383244","-1.35215438864747","0.640223829119327","-2.11200259526024","0.464988989856438","0.448296231926403","0.371630997643636","0.0933579922128027","0.449342896084967","0.112880117265689","0.646887364777304","0.670330437981871","0.335976364147374","0.804293083880064","0.484195486089795","0.035899254163392","128","63","6","full","0.0404217532940301"
 "lena","(0,6]","lp_n","1.51878098383244","-1.35215438864747","0.640223829119327","-2.11200259526024","0.464988989856438","0.448296231926403","0.371630997643636","0.0933579922128027","0.449342896084967","0.112880117265689","0.646887364777304","0.670330437981871","0.335976364147374","0.804293083880064","0.484195486089795","0.035899254163392","128","63","6","full","0.0404217532940301"
 "lena","(0,6]","peak_wc_adu_ph","1.45991987404817",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "lena","(0,6]","peak_wc_adu_ph","1.45991987404817",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
@@ -275,12 +268,12 @@
 "lena","(0,6]","peak_voc_mal_ph","1.37952452648307","-0.935849117069636","0.621118962387872","-1.50671477404553","0.369774950132164","0.362465840925768","0.369294399584552","0.000480550547612753","0.397892091544721","0.000517763775182357","0.679028881883643","0.630786882825508","0.022754423200388","0.82403208789685","0.382232212887373","0.0197663719616058","127","64","6","full","0.000420665751505312"
 "lena","(0,6]","peak_voc_mal_ph","1.37952452648307","-0.935849117069636","0.621118962387872","-1.50671477404553","0.369774950132164","0.362465840925768","0.369294399584552","0.000480550547612753","0.397892091544721","0.000517763775182357","0.679028881883643","0.630786882825508","0.022754423200388","0.82403208789685","0.382232212887373","0.0197663719616058","127","64","6","full","0.000420665751505312"
 "lena","(0,6]","voc_mal_ph","1.37394031990829","-0.560332039691969","0.640459856933121","-0.874890180276328","0.246610758120518","0.244771587544019","0.246610758120517",NA,"0.256355503623865",NA,"0.783159177639899","0.506315616610691",NA,"0.884962811444582","0.252229374830006","0.00745778728598756","126","62",NA,"no_exp","0.000590243644325024"
 "lena","(0,6]","voc_mal_ph","1.37394031990829","-0.560332039691969","0.640459856933121","-0.874890180276328","0.246610758120518","0.244771587544019","0.246610758120517",NA,"0.256355503623865",NA,"0.783159177639899","0.506315616610691",NA,"0.884962811444582","0.252229374830006","0.00745778728598756","126","62",NA,"no_exp","0.000590243644325024"
 "lena","(0,6]","peak_voc_fem_ph","1.31006337391543","-1.88767172716445","0.693402689742737","-2.72233112892136","0.144548066692493","0.133298498940964","0.035132361969358","0.109415704723135","0.0368917686448678","0.114895174662087","0.89829243015061","0.192072300566396","0.338961907390915","0.947782902436318","0.211124290796491","0.0778257918555263","126","63","6","full","0.160666145029813"
 "lena","(0,6]","peak_voc_fem_ph","1.31006337391543","-1.88767172716445","0.693402689742737","-2.72233112892136","0.144548066692493","0.133298498940964","0.035132361969358","0.109415704723135","0.0368917686448678","0.114895174662087","0.89829243015061","0.192072300566396","0.338961907390915","0.947782902436318","0.211124290796491","0.0778257918555263","126","63","6","full","0.160666145029813"
-"lena","(0,6]","lena_CTC","1.48230393978932","-0.883050839599528","0.374036268979187","-2.36086955420001","0.821579094959748","0.80784565493231","0.532125515160298","0.289453579799449","0.601148779314788","0.326999290970509","0.201564304310566","0.775337848498826","0.571838518264124","0.448959134343613","0.824561562276704","0.0167159073443935","128","62","6","full","0.00337263451011137"
 "lena","(0,6]","peak_lena_CTC","1.28695491291596","-2.58576457000797","0.600607391402496","-4.30524933096457","0.553198778639949","0.488016660878532","0.189420656715789","0.36377812192416","0.23284206567179","0.447167963745982","0.549222672595039","0.482537113258442","0.668706186412225","0.741095589377672","0.6058443211667","0.117827660288167","129","64","6","full","0.251185130390354"
 "lena","(0,6]","peak_lena_CTC","1.28695491291596","-2.58576457000797","0.600607391402496","-4.30524933096457","0.553198778639949","0.488016660878532","0.189420656715789","0.36377812192416","0.23284206567179","0.447167963745982","0.549222672595039","0.482537113258442","0.668706186412225","0.741095589377672","0.6058443211667","0.117827660288167","129","64","6","full","0.251185130390354"
 "lena","(0,6]","standardScore","1.33492692129691",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "lena","(0,6]","standardScore","1.33492692129691",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
+"lena","(0,6]","lena_CTC_ph","1.39370287814851","-1.3671748133984","0.531700379081857","-2.57132563222778","0.638791813877362","0.614728412289451","0.440993795795362","0.197798018082","0.517245868325635","0.231999199515699","0.423664558682429","0.719198073082538","0.481662952193439","0.650895197925464","0.652398590687402","0.037670178397951","129","63","6","full","0.00367525918269657"
+"lena","(0,6]","lena_CVC_ph","1.28464567571865","-0.971649061734697","0.509079642375553","-1.90863861143735","0.62327462356744","0.609509953478328","0.538434017073165","0.0848406064942746","0.554387933165334","0.0873544519689272","0.387887830614163","0.744572315604962","0.295557865686108","0.622806415039347","0.631594391972434","0.0220844384941059","128","63","6","full","0.000767849842930568"
 "lena","(6,12]","voc_fem_ph","1.42291557987352","-0.883685652421772","0.29047206754924","-3.04223968892284","0.566213066197061","0.559142416808505","0.425071593919514","0.14114147227755","0.467303635910275","0.155164269070205","0.476884868987189","0.68359610583317","0.39390896038324","0.690568511436185","0.571630029353454","0.0124876125449497","421","130","8","full","0.0636461313707909"
 "lena","(6,12]","voc_fem_ph","1.42291557987352","-0.883685652421772","0.29047206754924","-3.04223968892284","0.566213066197061","0.559142416808505","0.425071593919514","0.14114147227755","0.467303635910275","0.155164269070205","0.476884868987189","0.68359610583317","0.39390896038324","0.690568511436185","0.571630029353454","0.0124876125449497","421","130","8","full","0.0636461313707909"
 "lena","(6,12]","peak_lena_CVC","1.25148414456127","0.0867372011954102","0.315598726920417","0.274833812042855","0.435295331882265","0.435239656017439","0.327728867426308","0.107566464455955","0.347661774942419","0.114108800517693","0.599050760397927","0.589628505876725","0.337799941559635","0.773983695175762","0.435367559674448","0.00012790365700914","424","129","8","full","3.22326444312727e-06"
 "lena","(6,12]","peak_lena_CVC","1.25148414456127","0.0867372011954102","0.315598726920417","0.274833812042855","0.435295331882265","0.435239656017439","0.327728867426308","0.107566464455955","0.347661774942419","0.114108800517693","0.599050760397927","0.589628505876725","0.337799941559635","0.773983695175762","0.435367559674448","0.00012790365700914","424","129","8","full","3.22326444312727e-06"
-"lena","(6,12]","lena_CVC","1.36959660953279","0.223817872062041","0.28251954068136","0.792220854961939","0.580674694525897","0.58019598884387","0.384608103050729","0.196066591475166","0.422374277781235","0.215319137362087","0.460500498169844","0.649903283405488","0.464024931832425","0.678601870149091","0.581020384476296","0.000824395632425788","422","128","8","full","0.0044640746540876"
 "lena","(6,12]","lp_dur","1.4126918084944","0.043697868319602","0.312565832724254","0.139803726910076","0.422587809819031","0.422573765667344","0.386235836227091","0.0363519735919389","0.398639665532498","0.0375194045578319","0.595955581482585","0.631379177303542","0.193699263183503","0.771981594005055","0.422606999355966","3.3233688622232e-05","427","130","8","full","0.932579360993785"
 "lena","(6,12]","lp_dur","1.4126918084944","0.043697868319602","0.312565832724254","0.139803726910076","0.422587809819031","0.422573765667344","0.386235836227091","0.0363519735919389","0.398639665532498","0.0375194045578319","0.595955581482585","0.631379177303542","0.193699263183503","0.771981594005055","0.422606999355966","3.3233688622232e-05","427","130","8","full","0.932579360993785"
 "lena","(6,12]","lp_n","1.3644814164853","0.189474927634779","0.30787402910672","0.615430045153631","0.437671645316146","0.437395058061131","0.389166864692133","0.0485047806240144","0.398740363339796","0.0496979974516509","0.576161623216022","0.631458916589034","0.222930476722342","0.759053109614882","0.438027009566271","0.000631951505139101","424","130","8","full","0.733150920698703"
 "lena","(6,12]","lp_n","1.3644814164853","0.189474927634779","0.30787402910672","0.615430045153631","0.437671645316146","0.437395058061131","0.389166864692133","0.0485047806240144","0.398740363339796","0.0496979974516509","0.576161623216022","0.631458916589034","0.222930476722342","0.759053109614882","0.438027009566271","0.000631951505139101","424","130","8","full","0.733150920698703"
 "lena","(6,12]","peak_wc_adu_ph","1.44113010241661","-1.1325993662247","0.342615919293198","-3.30574063388883","0.300709362406268","0.294319785246039","0.183950055290215","0.116759307116053","0.192575862811774","0.122234398210452","0.73208185601438","0.438834664551211","0.349620362980265","0.85561782123468","0.315568133182731","0.0212483479366915","421","130","8","full","6.69073039224476e-07"
 "lena","(6,12]","peak_wc_adu_ph","1.44113010241661","-1.1325993662247","0.342615919293198","-3.30574063388883","0.300709362406268","0.294319785246039","0.183950055290215","0.116759307116053","0.192575862811774","0.122234398210452","0.73208185601438","0.438834664551211","0.349620362980265","0.85561782123468","0.315568133182731","0.0212483479366915","421","130","8","full","6.69073039224476e-07"
@@ -302,12 +295,12 @@
 "lena","(6,12]","peak_voc_mal_ph","1.44186546303042","-0.537226708392778","0.322520244134602","-1.66571468973765","0.403224458273201","0.401182578169984","0.362915705335651","0.0403087529375458","0.367562546834186","0.0408248738525422","0.604416768909409","0.606269368213657","0.202051661345662","0.777442453760668","0.406246457756955","0.00506387958697095","415","130","8","full","6.68122846432841e-08"
 "lena","(6,12]","peak_voc_mal_ph","1.44186546303042","-0.537226708392778","0.322520244134602","-1.66571468973765","0.403224458273201","0.401182578169984","0.362915705335651","0.0403087529375458","0.367562546834186","0.0408248738525422","0.604416768909409","0.606269368213657","0.202051661345662","0.777442453760668","0.406246457756955","0.00506387958697095","415","130","8","full","6.68122846432841e-08"
 "lena","(6,12]","voc_mal_ph","1.31724083619458","-0.667152573538013","0.322842322459332","-2.06649663667332","0.403935387382668","0.400739412677102","0.369397481327665","0.0345379060550025","0.3701834022326","0.0346113880459564","0.597332784880079","0.608426990059284","0.186041361116168","0.772873071648947","0.408651506554973","0.00791209387787103","410","129","8","full","5.02213613339343e-11"
 "lena","(6,12]","voc_mal_ph","1.31724083619458","-0.667152573538013","0.322842322459332","-2.06649663667332","0.403935387382668","0.400739412677102","0.369397481327665","0.0345379060550025","0.3701834022326","0.0346113880459564","0.597332784880079","0.608426990059284","0.186041361116168","0.772873071648947","0.408651506554973","0.00791209387787103","410","129","8","full","5.02213613339343e-11"
 "lena","(6,12]","peak_voc_fem_ph","1.48659886213676","-1.19186822234887","0.329151096943084","-3.6210367621985","0.349079233294363","0.340694209620743","0.26668035909652","0.0823988741978407","0.275447256600807","0.0851076694274873","0.672319251635135","0.524830693272418","0.291732187849554","0.819950761713858","0.3647146120792","0.0240204024584576","427","130","8","full","5.49564743934237e-07"
 "lena","(6,12]","peak_voc_fem_ph","1.48659886213676","-1.19186822234887","0.329151096943084","-3.6210367621985","0.349079233294363","0.340694209620743","0.26668035909652","0.0823988741978407","0.275447256600807","0.0851076694274873","0.672319251635135","0.524830693272418","0.291732187849554","0.819950761713858","0.3647146120792","0.0240204024584576","427","130","8","full","5.49564743934237e-07"
-"lena","(6,12]","lena_CTC","1.45258792665692","0.0442173906973573","0.269976325922428","0.16378247443097","0.667543110928265","0.667524279618053","0.335733448031141","0.331809662897129","0.417078319456127","0.412203840254851","0.413007882886873","0.645816010529413","0.642031027486095","0.642656893596321","0.667552489496792","2.82098787390906e-05","423","130","8","full","0.02761379030082"
 "lena","(6,12]","peak_lena_CTC","1.40072289076764","0.0390751628451698","0.302660207993115","0.129105715958732","0.503536027848809","0.503523618114852","0.339241326959268","0.164294700889545","0.381684561108621","0.184849974982639","0.558577679834161","0.617806248842322","0.429941827440224","0.747380545528287","0.503548263290711","2.46451758592531e-05","427","127","8","full","4.31323389132213e-06"
 "lena","(6,12]","peak_lena_CTC","1.40072289076764","0.0390751628451698","0.302660207993115","0.129105715958732","0.503536027848809","0.503523618114852","0.339241326959268","0.164294700889545","0.381684561108621","0.184849974982639","0.558577679834161","0.617806248842322","0.429941827440224","0.747380545528287","0.503548263290711","2.46451758592531e-05","427","127","8","full","4.31323389132213e-06"
 "lena","(6,12]","standardScore","1.30714927580513","-1.8255992196976","0.339413993081527","-5.3786798921372","0.270177411485921","0.254194800892461","0.251681543666905","0.0184958678190148","0.241778362392675","0.0177680912440335","0.70110548321196","0.491709632194322","0.133297003882434","0.837320418485038","0.31335078475343","0.0591559838609695","402","126","8","full","0.524542338728313"
 "lena","(6,12]","standardScore","1.30714927580513","-1.8255992196976","0.339413993081527","-5.3786798921372","0.270177411485921","0.254194800892461","0.251681543666905","0.0184958678190148","0.241778362392675","0.0177680912440335","0.70110548321196","0.491709632194322","0.133297003882434","0.837320418485038","0.31335078475343","0.0591559838609695","402","126","8","full","0.524542338728313"
+"lena","(6,12]","lena_CTC_ph","1.40202916797513","0.122477709433577","0.294048359211733","0.416522335856277","0.576821776661071","0.576688146908477","0.37068502518399","0.206136751477079","0.431495844067512","0.239953452470296","0.49260054295419","0.656883432632847","0.489850438879354","0.701855072614133","0.576919812490466","0.00023166558198947","420","128","8","full","0.000158722344111123"
+"lena","(6,12]","lena_CVC_ph","1.33362952780026","0.682719701949146","0.295713075383236","2.30872341733405","0.499757373753845","0.495699080426463","0.408197204762034","0.0915601689918081","0.419711964154474","0.0941429728512477","0.514353877895771","0.64785180724798","0.306827268754339","0.717184688832501","0.503819607587271","0.00812052716080785","423","127","8","full","1.34208175761933e-05"
 "lena","(12,18]","voc_fem_ph","1.48049971835732","0.0611285233096322","0.310138976654299","0.197100422426975","0.497653395733077","0.497617763658226","0.497653395733075",NA,"0.501957918976554",NA,"0.506691722079621","0.708489886290943",NA,"0.711822816492714","0.497689363842525","7.16001842998854e-05","319","97",NA,"no_exp","0.144947862842472"
 "lena","(12,18]","voc_fem_ph","1.48049971835732","0.0611285233096322","0.310138976654299","0.197100422426975","0.497653395733077","0.497617763658226","0.497653395733075",NA,"0.501957918976554",NA,"0.506691722079621","0.708489886290943",NA,"0.711822816492714","0.497689363842525","7.16001842998854e-05","319","97",NA,"no_exp","0.144947862842472"
 "lena","(12,18]","peak_lena_CVC","1.44231667424821","1.43790074944236","0.325266849260445","4.42068028977346","0.514925411464387","0.497474368860549","0.291646774942434","0.223278636521953","0.323997965409689","0.24804602748253","0.538881939594573","0.569208191622089","0.498042194480076","0.734085784901583","0.531364796901786","0.0338904280412369","314","96","7","full","0.000321611674658228"
 "lena","(12,18]","peak_lena_CVC","1.44231667424821","1.43790074944236","0.325266849260445","4.42068028977346","0.514925411464387","0.497474368860549","0.291646774942434","0.223278636521953","0.323997965409689","0.24804602748253","0.538881939594573","0.569208191622089","0.498042194480076","0.734085784901583","0.531364796901786","0.0338904280412369","314","96","7","full","0.000321611674658228"
-"lena","(12,18]","lena_CVC","1.35877559821011","1.38996813081417","0.292665172044675","4.74934588596008","0.631448114805981","0.612191185351413","0.340619821635842","0.290828293170142","0.395536244910577","0.337717078359734","0.427971654803476","0.628916723351015","0.581134303203428","0.654195425544597","0.642687641042765","0.030496455691352","316","97","7","full","0.0210250246834759"
 "lena","(12,18]","lp_dur","1.28229137513026","0.996297816153081","0.323859926424849","3.07632323378629","0.450523240656604","0.442192835879498","0.450523240656602",NA,"0.459017243534445",NA,"0.559836396214444","0.677508113260974",NA,"0.748222156992456","0.460683346524332","0.0184905106448333","319","97",NA,"no_exp","0.458763721879652"
 "lena","(12,18]","lp_dur","1.28229137513026","0.996297816153081","0.323859926424849","3.07632323378629","0.450523240656604","0.442192835879498","0.450523240656602",NA,"0.459017243534445",NA,"0.559836396214444","0.677508113260974",NA,"0.748222156992456","0.460683346524332","0.0184905106448333","319","97",NA,"no_exp","0.458763721879652"
 "lena","(12,18]","lp_n","1.24377780907464","0.896426357202333","0.302788121871154","2.96057306232043","0.582807233144924","0.574914594335372","0.438904545963642","0.143902687181279","0.495745740093263","0.162539086947626","0.471222134443916","0.704092138923069","0.403161365891656","0.68645621451329","0.58845704604271","0.0135424517073388","319","97","7","full","0.166749349708827"
 "lena","(12,18]","lp_n","1.24377780907464","0.896426357202333","0.302788121871154","2.96057306232043","0.582807233144924","0.574914594335372","0.438904545963642","0.143902687181279","0.495745740093263","0.162539086947626","0.471222134443916","0.704092138923069","0.403161365891656","0.68645621451329","0.58845704604271","0.0135424517073388","319","97","7","full","0.166749349708827"
 "lena","(12,18]","peak_wc_adu_ph","1.26912861169887","0.103346660245872","0.35434614702397","0.291654533607448","0.395314233611322","0.395238174462755","0.286014142888871","0.10930009072245","0.311476524361375","0.119030520752393","0.658517858393878","0.558100819172822","0.345008000997648","0.811491132664971","0.395430576208254","0.00019240174549824","311","97","7","full","1.51370402727752e-05"
 "lena","(12,18]","peak_wc_adu_ph","1.26912861169887","0.103346660245872","0.35434614702397","0.291654533607448","0.395314233611322","0.395238174462755","0.286014142888871","0.10930009072245","0.311476524361375","0.119030520752393","0.658517858393878","0.558100819172822","0.345008000997648","0.811491132664971","0.395430576208254","0.00019240174549824","311","97","7","full","1.51370402727752e-05"
@@ -329,12 +322,12 @@
 "lena","(12,18]","peak_voc_mal_ph","1.44977389978799","-0.0432589234149297","0.3330426429248","-0.129890043614317","0.412965844789121","0.412950743822286","0.393014426028024","0.0199514187610991","0.392087207068434","0.0199043483928864","0.585649195365665","0.626168673017449","0.141082771424744","0.765277201650268","0.412987310930742","3.65671084556312e-05","315","97","7","full","3.60559209334777e-06"
 "lena","(12,18]","peak_voc_mal_ph","1.44977389978799","-0.0432589234149297","0.3330426429248","-0.129890043614317","0.412965844789121","0.412950743822286","0.393014426028024","0.0199514187610991","0.392087207068434","0.0199043483928864","0.585649195365665","0.626168673017449","0.141082771424744","0.765277201650268","0.412987310930742","3.65671084556312e-05","315","97","7","full","3.60559209334777e-06"
 "lena","(12,18]","voc_mal_ph","1.48975358430842","0.263384236239893","0.328341028156636","0.802166691499319","0.460349333954289","0.459729185183799","0.460349333954287",NA,"0.470029600043202",NA,"0.550998487487116","0.685587047750468",NA,"0.742292723584918","0.461076311647876","0.00134712646407691","301","97",NA,"no_exp","4.46426291916265e-05"
 "lena","(12,18]","voc_mal_ph","1.48975358430842","0.263384236239893","0.328341028156636","0.802166691499319","0.460349333954289","0.459729185183799","0.460349333954287",NA,"0.470029600043202",NA,"0.550998487487116","0.685587047750468",NA,"0.742292723584918","0.461076311647876","0.00134712646407691","301","97",NA,"no_exp","4.46426291916265e-05"
 "lena","(12,18]","peak_voc_fem_ph","1.5915207394855","-0.167824331606644","0.362840914266096","-0.462528686838131","0.359121041755205","0.358941361302779","0.267710275964873","0.0914107657903326","0.290016198557954","0.0990272140515901","0.694277716968642","0.53853152048692","0.314685897446311","0.833233290842752","0.359441695261345","0.000500333958566098","317","97","7","full","0.00674722538149824"
 "lena","(12,18]","peak_voc_fem_ph","1.5915207394855","-0.167824331606644","0.362840914266096","-0.462528686838131","0.359121041755205","0.358941361302779","0.267710275964873","0.0914107657903326","0.290016198557954","0.0990272140515901","0.694277716968642","0.53853152048692","0.314685897446311","0.833233290842752","0.359441695261345","0.000500333958566098","317","97","7","full","0.00674722538149824"
-"lena","(12,18]","lena_CTC","1.34344929219761","1.2367702644144","0.287711654287287","4.2986450009406","0.687392253280481","0.671915489274699","0.3799514625393","0.307440790741182","0.480356130113354","0.388684037409511","0.395216395415537","0.693077290144002","0.623445296244595","0.628662385876185","0.694430674646546","0.0225151853718471","306","94","7","full","0.00124905291728502"
 "lena","(12,18]","peak_lena_CTC","1.24532426298121","0.997440059646685","0.296780413207665","3.36086889584843","0.672880620731064","0.663478023151204","0.352724781001475","0.320155839729588","0.467949878678373","0.424741595796771","0.433979924539533","0.684068621322724","0.651722023409345","0.658771526813001","0.677451672101955","0.0139736489507515","313","96","7","full","0.195467308013104"
 "lena","(12,18]","peak_lena_CTC","1.24532426298121","0.997440059646685","0.296780413207665","3.36086889584843","0.672880620731064","0.663478023151204","0.352724781001475","0.320155839729588","0.467949878678373","0.424741595796771","0.433979924539533","0.684068621322724","0.651722023409345","0.658771526813001","0.677451672101955","0.0139736489507515","313","96","7","full","0.195467308013104"
 "lena","(12,18]","standardScore","1.42019547795022","-0.47478534810463","0.336529217528646","-1.41082950119841","0.497757796097596","0.495871773520462","0.379622969439063","0.118134826658537","0.421050208442842","0.131026564231436","0.557050551905144","0.648883817368597","0.36197591664562","0.746358192763464","0.499660810260661","0.00378903674019878","308","96","7","full","0.221280124905281"
 "lena","(12,18]","standardScore","1.42019547795022","-0.47478534810463","0.336529217528646","-1.41082950119841","0.497757796097596","0.495871773520462","0.379622969439063","0.118134826658537","0.421050208442842","0.131026564231436","0.557050551905144","0.648883817368597","0.36197591664562","0.746358192763464","0.499660810260661","0.00378903674019878","308","96","7","full","0.221280124905281"
+"lena","(12,18]","lena_CTC_ph","1.32857873869435","1.38421575335876","0.306217445433596","4.52036869224988","0.627866290361462","0.609578413937587","0.416356824042287","0.211509466319175","0.504334617390015","0.256202227538399","0.450766989349063","0.710165204294054","0.506164229809258","0.671391829968956","0.638705437803363","0.0291270238657764","308","96","7","full","3.76390981488875e-05"
+"lena","(12,18]","lena_CVC_ph","1.39361750514459","1.47968983828477","0.309532938227905","4.78039541367095","0.534543249966345","0.513978382044547","0.424694686253813","0.109848563712531","0.434381026355862","0.112353964844876","0.476072782043356","0.659075888161494","0.335192429575723","0.689980276561118","0.552450232401076","0.0384718503565281","314","97","7","full","0.00513845082424697"
 "lena","(18,24]","voc_fem_ph","1.42119598725219","2.28907894509306","0.618696217150568","3.69984312436159","0.328942733896197","0.29251398685194","0.28981313603956","0.0391295978566369","0.265250559247627","0.0358132410988814","0.614183047579046","0.515024814205711","0.189243866740461","0.783698314135641","0.403258938147178","0.110744951295238","93","52","5","full","0.719040583665909"
 "lena","(18,24]","voc_fem_ph","1.42119598725219","2.28907894509306","0.618696217150568","3.69984312436159","0.328942733896197","0.29251398685194","0.28981313603956","0.0391295978566369","0.265250559247627","0.0358132410988814","0.614183047579046","0.515024814205711","0.189243866740461","0.783698314135641","0.403258938147178","0.110744951295238","93","52","5","full","0.719040583665909"
 "lena","(18,24]","peak_lena_CVC","1.48111122178545","1.69189847400468","0.57304062193605","2.95249308554865","0.537591382477329","0.506944612850248","0.385962605306989","0.15162877717034","0.384467944754183","0.151041586730669","0.460617915754195","0.620054791735523","0.388640691038225","0.678688378973881","0.563952166590888","0.0570075537406404","91","51","5","full","0.0102348051813855"
 "lena","(18,24]","peak_lena_CVC","1.48111122178545","1.69189847400468","0.57304062193605","2.95249308554865","0.537591382477329","0.506944612850248","0.385962605306989","0.15162877717034","0.384467944754183","0.151041586730669","0.460617915754195","0.620054791735523","0.388640691038225","0.678688378973881","0.563952166590888","0.0570075537406404","91","51","5","full","0.0102348051813855"
-"lena","(18,24]","lena_CVC","1.25269529685995","1.48570825836929","0.530787170561802","2.79906587944988","0.605692887852541","0.577800222025564","0.35220585004062","0.253487037811921","0.334463443459706","0.240717601735456","0.374443850078815","0.578328145138818","0.490629801108184","0.611918172698617","0.623851061298037","0.0460508392724732","90","50","5","full","0.833083312367075"
 "lena","(18,24]","lp_dur","1.20128623362554","1.61818790316387","0.520225458182114","3.11055116144929","0.593442681418795","0.561441455886261","0.411377561045953","0.182065120372841","0.408941378240857","0.180986928566433","0.404149681309266","0.639485244740531","0.42542558522782","0.635727678577287","0.615366167631001","0.0539247117447399","95","52","5","full","0.888806300935333"
 "lena","(18,24]","lp_dur","1.20128623362554","1.61818790316387","0.520225458182114","3.11055116144929","0.593442681418795","0.561441455886261","0.411377561045953","0.182065120372841","0.408941378240857","0.180986928566433","0.404149681309266","0.639485244740531","0.42542558522782","0.635727678577287","0.615366167631001","0.0539247117447399","95","52","5","full","0.888806300935333"
 "lena","(18,24]","lp_n","1.36070762448891","1.48927826424929","0.470080422615228","3.16813505221913","0.691316882001901","0.66006316542683","0.510544117256009","0.180772764745891","0.516312707539012","0.182815299325958","0.312170899709465","0.718549029321599","0.427569057961352","0.558722560587511","0.705272124427754","0.0452089590009238","96","52","5","full","0.48996331805644"
 "lena","(18,24]","lp_n","1.36070762448891","1.48927826424929","0.470080422615228","3.16813505221913","0.691316882001901","0.66006316542683","0.510544117256009","0.180772764745891","0.516312707539012","0.182815299325958","0.312170899709465","0.718549029321599","0.427569057961352","0.558722560587511","0.705272124427754","0.0452089590009238","96","52","5","full","0.48996331805644"
 "lena","(18,24]","peak_wc_adu_ph","1.26419781765148","1.96956338894678","0.657725496216954","2.99450667531536","0.141605050459882","0.129571812769291","0.141605050459882",NA,"0.129630688974701",NA,"0.785807627340346","0.360042621052982",NA,"0.886457910642319","0.214549274035756","0.084977461266465","93","51",NA,"no_exp","0.0218358887334142"
 "lena","(18,24]","peak_wc_adu_ph","1.26419781765148","1.96956338894678","0.657725496216954","2.99450667531536","0.141605050459882","0.129571812769291","0.141605050459882",NA,"0.129630688974701",NA,"0.785807627340346","0.360042621052982",NA,"0.886457910642319","0.214549274035756","0.084977461266465","93","51",NA,"no_exp","0.0218358887334142"
@@ -356,12 +349,12 @@
 "lena","(18,24]","peak_voc_mal_ph","1.25070416821664","0.429655925629675","0.635894499738811","0.675671712534316","0.337152730471644","0.335821145823087","0.297260099957353","0.0398926305142907","0.299462317209745","0.0401881704780277","0.667757897267718","0.547231502391579","0.200469874240564","0.817164547241079","0.339770645643817","0.00394949982072954","95","51","5","full","0.000266326900630231"
 "lena","(18,24]","peak_voc_mal_ph","1.25070416821664","0.429655925629675","0.635894499738811","0.675671712534316","0.337152730471644","0.335821145823087","0.297260099957353","0.0398926305142907","0.299462317209745","0.0401881704780277","0.667757897267718","0.547231502391579","0.200469874240564","0.817164547241079","0.339770645643817","0.00394949982072954","95","51","5","full","0.000266326900630231"
 "lena","(18,24]","voc_mal_ph","1.3037645581556","0.123039525724635","0.613364590423668","0.200597699387322","0.461936922994735","0.461787712318924","0.440783199618433","0.0211537233763025","0.437465656716131","0.0209945104459888","0.534013359720998","0.661411866174271","0.144894825463123","0.730762177264942","0.462110723250467","0.000323010931543411","92","51","5","full","0.00615483418180813"
 "lena","(18,24]","voc_mal_ph","1.3037645581556","0.123039525724635","0.613364590423668","0.200597699387322","0.461936922994735","0.461787712318924","0.440783199618433","0.0211537233763025","0.437465656716131","0.0209945104459888","0.534013359720998","0.661411866174271","0.144894825463123","0.730762177264942","0.462110723250467","0.000323010931543411","92","51","5","full","0.00615483418180813"
 "lena","(18,24]","peak_voc_fem_ph","1.48568071224418","2.22625529977309","0.661718989533418","3.36435153741445","0.0757169251791014","0.0676632385578892","0.0757169251791013",NA,"0.068422205717012",NA,"0.835235801461246","0.261576386008011",NA,"0.913912359836131","0.174028976497749","0.106365737939859","94","52",NA,"no_exp","0.137746847375784"
 "lena","(18,24]","peak_voc_fem_ph","1.48568071224418","2.22625529977309","0.661718989533418","3.36435153741445","0.0757169251791014","0.0676632385578892","0.0757169251791013",NA,"0.068422205717012",NA,"0.835235801461246","0.261576386008011",NA,"0.913912359836131","0.174028976497749","0.106365737939859","94","52",NA,"no_exp","0.137746847375784"
-"lena","(18,24]","lena_CTC","1.48590396473611","2.01343687191041","0.495132823393818","4.06645808312524","0.567585542539854","0.518558250031558","0.146292188444892","0.421293354094962","0.135169324001451","0.389261644689739","0.399537190089681","0.367653809991752","0.623908362413696","0.6320895427783","0.604936934535935","0.0863786845043776","94","52","5","full","0.097585867289211"
 "lena","(18,24]","peak_lena_CTC","1.36311242446992","2.75155518718428","0.547926942465865","5.02175559172416","0.407483581551814","0.341742325848729","0.171429384779338","0.236054196772476","0.145386415796413","0.20019364618631","0.502503339725525","0.381295706501415","0.447430046137169","0.708874699594735","0.503077060987562","0.161334735138832","94","51","5","full","0.212851774915248"
 "lena","(18,24]","peak_lena_CTC","1.36311242446992","2.75155518718428","0.547926942465865","5.02175559172416","0.407483581551814","0.341742325848729","0.171429384779338","0.236054196772476","0.145386415796413","0.20019364618631","0.502503339725525","0.381295706501415","0.447430046137169","0.708874699594735","0.503077060987562","0.161334735138832","94","51","5","full","0.212851774915248"
 "lena","(18,24]","standardScore","1.38029638474242","1.47267456534427","0.632614714761101","2.32791702592693","0.364093041389826","0.346791164485396","0.364093041389827",NA,"0.342475412104287",NA,"0.598150672912278","0.58521398830196",NA,"0.773402012482692","0.394311646718137","0.0475204822327404","89","52",NA,"no_exp","0.0858191293578022"
 "lena","(18,24]","standardScore","1.38029638474242","1.47267456534427","0.632614714761101","2.32791702592693","0.364093041389826","0.346791164485396","0.364093041389827",NA,"0.342475412104287",NA,"0.598150672912278","0.58521398830196",NA,"0.773402012482692","0.394311646718137","0.0475204822327404","89","52",NA,"no_exp","0.0858191293578022"
+"lena","(18,24]","lena_CTC_ph","1.58171319589329","2.03276282037859","0.529447351252879","3.83940502406571","0.550858185700491","0.504076197080095","0.31184466550973","0.239013520190761","0.296275301374607","0.227080372246784","0.426717661416507","0.544311768543183","0.476529508264477","0.653236298299863","0.589001845522455","0.0849256484423598","95","52","5","full","0.919499803991051"
+"lena","(18,24]","lena_CVC_ph","1.55058391370275","2.04480908178096","0.507506708212767","4.02912719909053","0.616919272766893","0.560517574992869","0.585084957197207","0.031834315569687","0.522690835252891","0.0284394681321731","0.342228564969357","0.722973606193816","0.16864005494595","0.585003046974422","0.651942337135671","0.0914247621428024","92","51","5","full","0.481974248240425"
 "lena","(24,30]","voc_fem_ph","1.52335026028621","-1.1474244554249","0.531123815163361","-2.1603709392545","0.481369007943718","0.467639981095211","0.314316182072759","0.167052825870959","0.354811671129123","0.188575376308168","0.585449746103901","0.595660701346935","0.434252664134796","0.765146878778121","0.496160776206542","0.0285207951113315","96","40","3","full","0.410235515382895"
 "lena","(24,30]","voc_fem_ph","1.52335026028621","-1.1474244554249","0.531123815163361","-2.1603709392545","0.481369007943718","0.467639981095211","0.314316182072759","0.167052825870959","0.354811671129123","0.188575376308168","0.585449746103901","0.595660701346935","0.434252664134796","0.765146878778121","0.496160776206542","0.0285207951113315","96","40","3","full","0.410235515382895"
 "lena","(24,30]","peak_lena_CVC","1.37880167888979","0.638469871796075","0.504011084082233","1.26677744192607","0.582320323903505","0.57700242947171","0.43101011920821","0.151310204695294","0.487533483205872","0.171153269615126","0.4724548642285","0.698235979598496","0.413706743497282","0.687353522016509","0.586134678877238","0.00913224940552879","90","39","3","full","0.0155380838044035"
 "lena","(24,30]","peak_lena_CVC","1.37880167888979","0.638469871796075","0.504011084082233","1.26677744192607","0.582320323903505","0.57700242947171","0.43101011920821","0.151310204695294","0.487533483205872","0.171153269615126","0.4724548642285","0.698235979598496","0.413706743497282","0.687353522016509","0.586134678877238","0.00913224940552879","90","39","3","full","0.0155380838044035"
-"lena","(24,30]","lena_CVC","1.34038272940689","-0.134121481921522","0.520198666222996","-0.25782742369437","0.604467688401177","0.604225962376864","0.478324097168199","0.126143591232979","0.549945239013222","0.145031512820089","0.454756749508226","0.741582927940781","0.380830031405204","0.674356544795278","0.604625861377177","0.000399899000312938","83","35","3","full","0.444446971780688"
 "lena","(24,30]","lp_dur","1.34096311438815","0.485786188660149","0.529127960784744","0.918088297469076","0.451989804708955","0.449362336307229","0.419818191899486","0.0321716128094696","0.424670417306282","0.0325434497619023","0.554344053718531","0.651667413107547","0.18039803148012","0.744542848812969","0.455175450617225","0.00581311430999522","94","40","3","full","0.00123273041081229"
 "lena","(24,30]","lp_dur","1.34096311438815","0.485786188660149","0.529127960784744","0.918088297469076","0.451989804708955","0.449362336307229","0.419818191899486","0.0321716128094696","0.424670417306282","0.0325434497619023","0.554344053718531","0.651667413107547","0.18039803148012","0.744542848812969","0.455175450617225","0.00581311430999522","94","40","3","full","0.00123273041081229"
 "lena","(24,30]","lp_n","1.23938400608957","-0.000876622400857196","0.538313750427429","-0.00162845998297674","0.42857028788211","0.428570279702491","0.427142800810951","0.00142748707115849","0.431050816893346","0.00144054743977738","0.57665783840417","0.656544603887158","0.0379545443890107","0.759379903871685","0.428570298788319","1.90858277653267e-08","94","40","3","full","0.000363242751171082"
 "lena","(24,30]","lp_n","1.23938400608957","-0.000876622400857196","0.538313750427429","-0.00162845998297674","0.42857028788211","0.428570279702491","0.427142800810951","0.00142748707115849","0.431050816893346","0.00144054743977738","0.57665783840417","0.656544603887158","0.0379545443890107","0.759379903871685","0.428570298788319","1.90858277653267e-08","94","40","3","full","0.000363242751171082"
 "lena","(24,30]","peak_wc_adu_ph","1.52312744022119","-0.55306894297553","0.596536675202208","-0.927133177164767","0.273638943381669","0.271691048062643","0.153649610104206","0.119989333277462","0.165010201255322","0.128861140742094","0.780066959202379","0.406214476914993","0.358972339800846","0.8832139940028","0.278809535274124","0.00711848721148137","96","40","3","full","0.0370382337494563"
 "lena","(24,30]","peak_wc_adu_ph","1.52312744022119","-0.55306894297553","0.596536675202208","-0.927133177164767","0.273638943381669","0.271691048062643","0.153649610104206","0.119989333277462","0.165010201255322","0.128861140742094","0.780066959202379","0.406214476914993","0.358972339800846","0.8832139940028","0.278809535274124","0.00711848721148137","96","40","3","full","0.0370382337494563"
@@ -383,12 +376,12 @@
 "lena","(24,30]","peak_voc_mal_ph","1.47247784961578","0.97220431880937","0.599881157437752","1.62066153729833","0.157900961588224","0.154082956558643","0.157900961588224",NA,"0.154569701649063",NA,"0.824333150457386","0.393153534448138",NA,"0.907927943427993","0.178262701831742","0.0241797452730985","96","40",NA,"no_exp","0.0206752320647669"
 "lena","(24,30]","peak_voc_mal_ph","1.47247784961578","0.97220431880937","0.599881157437752","1.62066153729833","0.157900961588224","0.154082956558643","0.157900961588224",NA,"0.154569701649063",NA,"0.824333150457386","0.393153534448138",NA,"0.907927943427993","0.178262701831742","0.0241797452730985","96","40",NA,"no_exp","0.0206752320647669"
 "lena","(24,30]","voc_mal_ph","1.25863551145159","0.449242202396393","0.584828440068782","0.76816066322554","0.342992892014113","0.34142058128541","0.16712272473477","0.175870167279344","0.187221252543293","0.197020680791873","0.736020154543189","0.432690712337685","0.443870117029603","0.857916169880944","0.346004672575087","0.00458409128967722","94","40","3","full","0.0464110567563693"
 "lena","(24,30]","voc_mal_ph","1.25863551145159","0.449242202396393","0.584828440068782","0.76816066322554","0.342992892014113","0.34142058128541","0.16712272473477","0.175870167279344","0.187221252543293","0.197020680791873","0.736020154543189","0.432690712337685","0.443870117029603","0.857916169880944","0.346004672575087","0.00458409128967722","94","40","3","full","0.0464110567563693"
 "lena","(24,30]","peak_voc_fem_ph","1.52652203900561","-0.872863003818493","0.563831207461988","-1.54809274879901","0.433879211841719","0.426759247312967","0.261802313606079","0.17207689823564","0.300832273403535","0.197730431726996","0.650519093497814","0.54848178949126","0.444668901236635","0.806547638703266","0.443169262668461","0.0164100153554941","94","40","3","full","0.266276089237231"
 "lena","(24,30]","peak_voc_fem_ph","1.52652203900561","-0.872863003818493","0.563831207461988","-1.54809274879901","0.433879211841719","0.426759247312967","0.261802313606079","0.17207689823564","0.300832273403535","0.197730431726996","0.650519093497814","0.54848178949126","0.444668901236635","0.806547638703266","0.443169262668461","0.0164100153554941","94","40","3","full","0.266276089237231"
-"lena","(24,30]","lena_CTC","1.58942440906629","-1.17307591322358","0.560631314817423","-2.09241953173023","0.443004101674447","0.428539601025096","0.443004088630127","1.30443187578133e-08","0.454339619949549","1.33780950989684e-08","0.57124823732717","0.67404719415598","0.000115663715567884","0.755809656809947","0.461190541715439","0.0326509406903428","88","39","3","full","0.0169226705814206"
 "lena","(24,30]","peak_lena_CTC","1.21110117975338","-0.18631639168897","0.583809238694234","-0.31913916282944","0.367078263792657","0.366769663269462","0.367078263792658",NA,"0.377140657899688",NA,"0.65027146398153","0.614117788294467",NA,"0.806394112070227","0.367610357349267","0.000840694079805217","91","40",NA,"no_exp","0.564135123748779"
 "lena","(24,30]","peak_lena_CTC","1.21110117975338","-0.18631639168897","0.583809238694234","-0.31913916282944","0.367078263792657","0.366769663269462","0.367078263792658",NA,"0.377140657899688",NA,"0.65027146398153","0.614117788294467",NA,"0.806394112070227","0.367610357349267","0.000840694079805217","91","40",NA,"no_exp","0.564135123748779"
 "lena","(24,30]","standardScore","1.36317920083546","-0.380146672161628","0.64104327726299","-0.593012493297971","0.300563604948635","0.299557358296049","0.300563604948635",NA,"0.306332011109125",NA,"0.712859953804508","0.55347268325467",NA,"0.844310342116279","0.302905224225318","0.00334786592926906","83","39",NA,"no_exp","0.973354845730773"
 "lena","(24,30]","standardScore","1.36317920083546","-0.380146672161628","0.64104327726299","-0.593012493297971","0.300563604948635","0.299557358296049","0.300563604948635",NA,"0.306332011109125",NA,"0.712859953804508","0.55347268325467",NA,"0.844310342116279","0.302905224225318","0.00334786592926906","83","39",NA,"no_exp","0.973354845730773"
+"lena","(24,30]","lena_CTC_ph","1.30893787656328","-0.500911022618703","0.549601879811028","-0.91140704029421","0.428884291848882","0.4263365607867","0.428884291848882",NA,"0.452529878685115",NA,"0.602602909541516","0.672703410638831",NA,"0.776275021845684","0.432276930043869","0.00594036925716818","93","39",NA,"no_exp","0.916309281429925"
+"lena","(24,30]","lena_CVC_ph","1.27896125419052","0.29990617042081","0.518771607602225","0.578108296649048","0.588463248669563","0.5872758404532","0.588463248669562",NA,"0.659067495124536",NA,"0.460913228590327","0.811829720523052",NA,"0.678905905549751","0.589293652472978","0.00201781201977794","87","38",NA,"no_exp","0.41998857000769"
 "lena","(30,36]","voc_fem_ph","1.38037139736952","0.0233122982059024","0.704550460898682","0.0330881881422186","0.502888495952283","0.502882226943013","0.306831475579855","0.196057020372427","0.32213302069898","0.20583429415922","0.521902227013955","0.567567635351929","0.453689645197265","0.722428008187636","0.502894692945557","1.24660025445675e-05","71","21","5","full","0.62721607150031"
 "lena","(30,36]","voc_fem_ph","1.38037139736952","0.0233122982059024","0.704550460898682","0.0330881881422186","0.502888495952283","0.502882226943013","0.306831475579855","0.196057020372427","0.32213302069898","0.20583429415922","0.521902227013955","0.567567635351929","0.453689645197265","0.722428008187636","0.502894692945557","1.24660025445675e-05","71","21","5","full","0.62721607150031"
 "lena","(30,36]","peak_lena_CVC","1.40621708512048","0.496889850281877","0.78691852075027","0.631437483270985","0.435195612372277","0.432790311199631","0.386604912093404","0.0485907002788732","0.413675282990102","0.0519930581836315","0.604352421754798","0.643175934710015","0.228019863572522","0.777401068789333","0.438317253807198","0.00552694260756694","69","21","5","full","0.836524373282317"
 "lena","(30,36]","peak_lena_CVC","1.40621708512048","0.496889850281877","0.78691852075027","0.631437483270985","0.435195612372277","0.432790311199631","0.386604912093404","0.0485907002788732","0.413675282990102","0.0519930581836315","0.604352421754798","0.643175934710015","0.228019863572522","0.777401068789333","0.438317253807198","0.00552694260756694","69","21","5","full","0.836524373282317"
-"lena","(30,36]","lena_CVC","1.5517592846906","0.602586160668071","0.671760377870216","0.897025458063694","0.545604733654347","0.540690707627036","0.545604733654347",NA,"0.531407632248157",NA,"0.442571513220211","0.728977113665551",NA,"0.665260485238835","0.549697275430064","0.00900656780302807","72","21",NA,"no_exp","0.216593035989655"
 "lena","(30,36]","lp_dur","1.60217362507511","0.189857551187878","0.657377732509243","0.288810438502659","0.648442622772876","0.647945508398724","0.544263679148575","0.104178943624302","0.607798437791708","0.116340299034277","0.392596516833646","0.779614287831943","0.341086937648273","0.626575228391329","0.648712136557784","0.000766628159059602","72","21","5","full","0.0210631934225797"
 "lena","(30,36]","lp_dur","1.60217362507511","0.189857551187878","0.657377732509243","0.288810438502659","0.648442622772876","0.647945508398724","0.544263679148575","0.104178943624302","0.607798437791708","0.116340299034277","0.392596516833646","0.779614287831943","0.341086937648273","0.626575228391329","0.648712136557784","0.000766628159059602","72","21","5","full","0.0210631934225797"
 "lena","(30,36]","lp_n","1.39178192829429","0.0863535801342969","0.544148278411542","0.158694943198896","0.749826396696267","0.749692062389549","0.749826396696267",NA,"0.768713871891495",NA,"0.256475258923913","0.876763292965379",NA,"0.506433864313903","0.749871216267446","0.000179153877897109","73","21",NA,"no_exp","0.513869713482082"
 "lena","(30,36]","lp_n","1.39178192829429","0.0863535801342969","0.544148278411542","0.158694943198896","0.749826396696267","0.749692062389549","0.749826396696267",NA,"0.768713871891495",NA,"0.256475258923913","0.876763292965379",NA,"0.506433864313903","0.749871216267446","0.000179153877897109","73","21",NA,"no_exp","0.513869713482082"
 "lena","(30,36]","peak_wc_adu_ph","1.49593779355642","1.06299532657133","0.784300911726991","1.35534118433022","0.311699270654767","0.303210023737521","0.212487935043096","0.0992113356116703","0.208558199305743","0.0973765287035765","0.675571347916564","0.456681726485463","0.312052124978467","0.821931473978557","0.330445400000715","0.0272353762631944","67","20","5","full","0.359980818245339"
 "lena","(30,36]","peak_wc_adu_ph","1.49593779355642","1.06299532657133","0.784300911726991","1.35534118433022","0.311699270654767","0.303210023737521","0.212487935043096","0.0992113356116703","0.208558199305743","0.0973765287035765","0.675571347916564","0.456681726485463","0.312052124978467","0.821931473978557","0.330445400000715","0.0272353762631944","67","20","5","full","0.359980818245339"
@@ -410,6 +403,7 @@
 "lena","(30,36]","peak_voc_mal_ph","1.25688400896596","0.205173404042431","0.704256970374493","0.291333153484202","0.625092625180172","0.624484860411776","0.545621989603243","0.0794706355769291","0.588627865592978","0.0857345039025661","0.404457540275701","0.76722087145292","0.292804548978608","0.63596976364895","0.625457139949103","0.000972279537326837","67","20","5","full","0.221878003516201"
 "lena","(30,36]","peak_voc_mal_ph","1.25688400896596","0.205173404042431","0.704256970374493","0.291333153484202","0.625092625180172","0.624484860411776","0.545621989603243","0.0794706355769291","0.588627865592978","0.0857345039025661","0.404457540275701","0.76722087145292","0.292804548978608","0.63596976364895","0.625457139949103","0.000972279537326837","67","20","5","full","0.221878003516201"
 "lena","(30,36]","voc_mal_ph","1.09296694387303","0.0565966791240339","0.644931623062613","0.0877560924292578","0.705938694511854","0.705887067398853","0.591022875854211","0.114915818657643","0.646026522093237","0.12561047921131","0.321428171781229","0.803757750875994","0.354415687027691","0.566946357057905","0.705960199971699","7.31325728460838e-05","67","20","5","full","0.147183367736302"
 "lena","(30,36]","voc_mal_ph","1.09296694387303","0.0565966791240339","0.644931623062613","0.0877560924292578","0.705938694511854","0.705887067398853","0.591022875854211","0.114915818657643","0.646026522093237","0.12561047921131","0.321428171781229","0.803757750875994","0.354415687027691","0.566946357057905","0.705960199971699","7.31325728460838e-05","67","20","5","full","0.147183367736302"
 "lena","(30,36]","peak_voc_fem_ph","1.49763718948152","-0.141681141484461","0.773773039653829","-0.183104262133308","0.395671314834752","0.395480591386486","0.395671314834751",NA,"0.401942868475752",NA,"0.613907544242744","0.633989643823739",NA,"0.783522523124093","0.395962616342845","0.000482024956358634","70","21",NA,"no_exp","0.049432088093319"
 "lena","(30,36]","peak_voc_fem_ph","1.49763718948152","-0.141681141484461","0.773773039653829","-0.183104262133308","0.395671314834752","0.395480591386486","0.395671314834751",NA,"0.401942868475752",NA,"0.613907544242744","0.633989643823739",NA,"0.783522523124093","0.395962616342845","0.000482024956358634","70","21",NA,"no_exp","0.049432088093319"
-"lena","(30,36]","lena_CTC","1.45320312602103","-0.237856880089995","0.601485414760391","-0.395449123541505","0.685626523285808","0.68468738540734","0.600162508387231","0.0854640148985759","0.617958005881204","0.0879981196480367","0.32369500603143","0.786103050421002","0.296644770134308","0.568942005859499","0.686057136790304","0.0013697513829647","72","21","5","full","0.867057377530462"
 "lena","(30,36]","peak_lena_CTC","1.21770895709078","-0.754902361516866","0.74553386400277","-1.01256615958904","0.381333623521543","0.376533332182822","0.102472433527701","0.278861189993843","0.111619099223581","0.30375227526059","0.673888394031115","0.334094446562018","0.551137256280675","0.820907055659235","0.389121499190995","0.0125881670081728","70","21","5","full","0.0576694042353197"
 "lena","(30,36]","peak_lena_CTC","1.21770895709078","-0.754902361516866","0.74553386400277","-1.01256615958904","0.381333623521543","0.376533332182822","0.102472433527701","0.278861189993843","0.111619099223581","0.30375227526059","0.673888394031115","0.334094446562018","0.551137256280675","0.820907055659235","0.389121499190995","0.0125881670081728","70","21","5","full","0.0576694042353197"
 "lena","(30,36]","standardScore","1.49701035820184","1.50028030374938","0.645773797359849","2.32322883009972","0.60405474405542","0.571030938406312","0.604054744055421",NA,"0.589574492175367",NA,"0.386453753571305","0.767837542827496",NA,"0.621654046533364","0.625701158240027","0.0546702198337147","71","20",NA,"no_exp","0.0649162349995381"
 "lena","(30,36]","standardScore","1.49701035820184","1.50028030374938","0.645773797359849","2.32322883009972","0.60405474405542","0.571030938406312","0.604054744055421",NA,"0.589574492175367",NA,"0.386453753571305","0.767837542827496",NA,"0.621654046533364","0.625701158240027","0.0546702198337147","71","20",NA,"no_exp","0.0649162349995381"
+"lena","(30,36]","lena_CTC_ph","1.42655858703851","-0.41226998375483","0.665864305958887","-0.619150148259013","0.670642296333503","0.668164725993319","0.360454772534006","0.310187523799498","0.413713667239372","0.356019195142945","0.378021859606672","0.643205773636534","0.596673440956563","0.614834823027024","0.671859050603814","0.00369432461049555","68","21","5","full","0.83530399112552"
+"lena","(30,36]","lena_CVC_ph","1.50602411240187","0.767167458364524","0.790379865110514","0.970631328338881","0.479637249398032","0.473139218503444","0.479637249398031",NA,"0.508930612228496",NA,"0.552143382477355","0.713393728756075",NA,"0.743063511738637","0.486687021353917","0.0135478028504729","67","21",NA,"no_exp","0.256895962901605"

+ 24 - 32
OUTPUT/df.icc.corpus.csv

@@ -21,8 +21,6 @@
 "aclew","bergelson","cp_dur","1.18502697546257","0.284595609154949","0.0930318454104069","3.05912032486795","0.355719630107628","0.351647407733605","0.355719630107631",NA,"0.232259100892522",NA,"0.420668320690166","0.481932672572137",NA,"0.648589485491529","0.363095250442738","0.0114478427091327","522","44",NA,"no_exp","0.538218530311069"
 "aclew","bergelson","cp_dur","1.18502697546257","0.284595609154949","0.0930318454104069","3.05912032486795","0.355719630107628","0.351647407733605","0.355719630107631",NA,"0.232259100892522",NA,"0.420668320690166","0.481932672572137",NA,"0.648589485491529","0.363095250442738","0.0114478427091327","522","44",NA,"no_exp","0.538218530311069"
 "aclew","bergelson","avg_can_voc_dur_chi","1.3984992106504","-0.796554730048958","0.115399842741355","-6.90256339286591","0.362946917325588","0.342660598961602","0.362946917325589",NA,"0.360684316145048",NA,"0.633081711137363","0.600569992711131",NA,"0.795664320638649","0.398553946984691","0.0558933480230896","515","44",NA,"no_exp","0.0155962514320226"
 "aclew","bergelson","avg_can_voc_dur_chi","1.3984992106504","-0.796554730048958","0.115399842741355","-6.90256339286591","0.362946917325588","0.342660598961602","0.362946917325589",NA,"0.360684316145048",NA,"0.633081711137363","0.600569992711131",NA,"0.795664320638649","0.398553946984691","0.0558933480230896","515","44",NA,"no_exp","0.0155962514320226"
 "aclew","bergelson","can_voc_chi_ph","0.732859707681891","0.601234913474399","0.0685871121548229","8.76600420378133","0.407767212467525","0.374989449393621","0.407767212467527",NA,"0.157424747887737",NA,"0.228640494913692","0.396767876582439",NA,"0.478163669587822","0.455372967419887","0.0803835180262657","522","44",NA,"no_exp","1.00183957830204e-09"
 "aclew","bergelson","can_voc_chi_ph","0.732859707681891","0.601234913474399","0.0685871121548229","8.76600420378133","0.407767212467525","0.374989449393621","0.407767212467527",NA,"0.157424747887737",NA,"0.228640494913692","0.396767876582439",NA,"0.478163669587822","0.455372967419887","0.0803835180262657","522","44",NA,"no_exp","1.00183957830204e-09"
-"aclew","bergelson","voc_chi","1.0455215585693","0.447336037088222","0.0724749215150797","6.17228729244151","0.530789923597111","0.513170169551952","0.53078992359711",NA,"0.288791619555229",NA,"0.255287321503254","0.537393356448727",NA,"0.505259657506172","0.546365513438195","0.0331953438862429","522","44",NA,"no_exp","0.0379665726291761"
-"aclew","bergelson","simple_CTC","1.04581938245424","0.532659656359437","0.0653412533081533","8.15196570912685","0.573642098863601","0.544034184720674","0.573642098863598",NA,"0.279184681556174",NA,"0.207503241295455","0.528379297054847",NA,"0.455525236727291","0.595648099043875","0.0516139143232002","522","44",NA,"no_exp","0.000830869661411565"
 "aclew","bergelson","peak_voc_chi","0.945441687980801","0.655632339138098","0.0872924577856724","7.51075586332854","0.36240375062175","0.338934430008325","0.362403750621745",NA,"0.209975203062761",NA,"0.369420574995617","0.458230513020206",NA,"0.607799781997013","0.403694578249507","0.0647601482411822","521","44",NA,"no_exp","2.40615681004747e-07"
 "aclew","bergelson","peak_voc_chi","0.945441687980801","0.655632339138098","0.0872924577856724","7.51075586332854","0.36240375062175","0.338934430008325","0.362403750621745",NA,"0.209975203062761",NA,"0.369420574995617","0.458230513020206",NA,"0.607799781997013","0.403694578249507","0.0647601482411822","521","44",NA,"no_exp","2.40615681004747e-07"
 "aclew","bergelson","voc_fem_ph","1.19064516967913","0.0827902487450635","0.0888412654132585","0.931889571360249","0.519903655062071","0.519485902414405","0.519903655062065",NA,"0.413853373672446",NA,"0.382165984227699","0.643314366132489",NA,"0.618195749118108","0.520289421765727","0.000803519351321942","520","44",NA,"no_exp","0.000415524341025238"
 "aclew","bergelson","voc_fem_ph","1.19064516967913","0.0827902487450635","0.0888412654132585","0.931889571360249","0.519903655062071","0.519485902414405","0.519903655062065",NA,"0.413853373672446",NA,"0.382165984227699","0.643314366132489",NA,"0.618195749118108","0.520289421765727","0.000803519351321942","520","44",NA,"no_exp","0.000415524341025238"
 "aclew","bergelson","peak_voc_fem_ph","1.3598143101406","0.0467980861691506","0.118206400627292","0.39590145644233","0.243062143458139","0.243006772520909","0.243062143458136",NA,"0.218093436125678",NA,"0.679180952319929","0.467004749575075",NA,"0.824124354888223","0.243234578202379","0.000227805681469662","522","44",NA,"no_exp","0.000160622962686573"
 "aclew","bergelson","peak_voc_fem_ph","1.3598143101406","0.0467980861691506","0.118206400627292","0.39590145644233","0.243062143458139","0.243006772520909","0.243062143458136",NA,"0.218093436125678",NA,"0.679180952319929","0.467004749575075",NA,"0.824124354888223","0.243234578202379","0.000227805681469662","522","44",NA,"no_exp","0.000160622962686573"
@@ -41,6 +39,7 @@
 "aclew","bergelson","avg_voc_dur_och","1.58927303274687","0.26647720775254","0.0755312401667633","3.52803961862923","0.73094881609455","0.726229180902561","0.730948816094543",NA,"0.743154262252605",NA,"0.273543823699938","0.86206395485057",NA,"0.523014171605262","0.732686042297051","0.00645686139449032","518","44",NA,"no_exp","0.00112113654223052"
 "aclew","bergelson","avg_voc_dur_och","1.58927303274687","0.26647720775254","0.0755312401667633","3.52803961862923","0.73094881609455","0.726229180902561","0.730948816094543",NA,"0.743154262252605",NA,"0.273543823699938","0.86206395485057",NA,"0.523014171605262","0.732686042297051","0.00645686139449032","518","44",NA,"no_exp","0.00112113654223052"
 "aclew","bergelson","avg_voc_dur_chi","1.32147107119218","-0.512079329736644","0.105055463543734","-4.874371236518","0.411496189816416","0.400622091900574","0.411496189816414",NA,"0.370137545048037",NA,"0.52935448964898","0.608389303857355",NA,"0.727567515526209","0.427047847922016","0.0264257560214419","517","44",NA,"no_exp","0.0328650511950922"
 "aclew","bergelson","avg_voc_dur_chi","1.32147107119218","-0.512079329736644","0.105055463543734","-4.874371236518","0.411496189816416","0.400622091900574","0.411496189816414",NA,"0.370137545048037",NA,"0.52935448964898","0.608389303857355",NA,"0.727567515526209","0.427047847922016","0.0264257560214419","517","44",NA,"no_exp","0.0328650511950922"
 "aclew","bergelson","voc_dur_fem_ph","1.27999558194833","-0.170769842320865","0.0944459616324852","-1.80812222533533","0.533857352931502","0.532285920679583","0.5338573529315",NA,"0.492506011687474",NA,"0.430036328477067","0.70178772551782",NA,"0.655771552049238","0.535229464012442","0.00294354333285879","518","44",NA,"no_exp","1.42400054495869e-07"
 "aclew","bergelson","voc_dur_fem_ph","1.27999558194833","-0.170769842320865","0.0944459616324852","-1.80812222533533","0.533857352931502","0.532285920679583","0.5338573529315",NA,"0.492506011687474",NA,"0.430036328477067","0.70178772551782",NA,"0.655771552049238","0.535229464012442","0.00294354333285879","518","44",NA,"no_exp","1.42400054495869e-07"
+"aclew","bergelson","simple_CTC_ph","0.828343217204983","0.630047377258626","0.0640524852699718","9.83642359235663","0.535866102218462","0.493314047674037","0.535866102218465",NA,"0.230217446907748",NA,"0.199400037674049","0.479809802846657",NA,"0.446542313419511","0.572722045993508","0.0794079983194704","522","44",NA,"no_exp","1.15865304528896e-05"
 "aclew","cougar","wc_adu_ph","1.29287803318666","0.205489696253379","0.108893925988327","1.88706297792409","0.327390553102902","0.308507340491855","0.327390553102903",NA,"0.365908365919824",NA,"0.751742593925724","0.604903600518152",NA,"0.867030907134067","0.366185280286019","0.0576779397941641","218","26",NA,"no_exp","0.0345529624200432"
 "aclew","cougar","wc_adu_ph","1.29287803318666","0.205489696253379","0.108893925988327","1.88706297792409","0.327390553102902","0.308507340491855","0.327390553102903",NA,"0.365908365919824",NA,"0.751742593925724","0.604903600518152",NA,"0.867030907134067","0.366185280286019","0.0576779397941641","218","26",NA,"no_exp","0.0345529624200432"
 "aclew","cougar","sc_fem_ph","1.5288136394467","0.186229588123408","0.121079293132834","1.53807957830658","0.420648186984277","0.40307031434708","0.420648186984279",NA,"0.538542745652296",NA,"0.741726045028179","0.733854716992605",NA,"0.861235185665436","0.444857901174013","0.0417875868269325","229","26",NA,"no_exp","0.00487717400667487"
 "aclew","cougar","sc_fem_ph","1.5288136394467","0.186229588123408","0.121079293132834","1.53807957830658","0.420648186984277","0.40307031434708","0.420648186984279",NA,"0.538542745652296",NA,"0.741726045028179","0.733854716992605",NA,"0.861235185665436","0.444857901174013","0.0417875868269325","229","26",NA,"no_exp","0.00487717400667487"
 "aclew","cougar","sc_mal_ph","1.6654908808521","0.0159146805897042","0.127186326473617","0.12512886432808","0.45711819165657","0.456980171048196","0.457118191656568",NA,"0.623259786362604",NA,"0.740194562509288","0.789468040114737",NA,"0.86034560643342","0.457282107420217","0.000301936372021208","224","26",NA,"no_exp","0.0113309274448156"
 "aclew","cougar","sc_mal_ph","1.6654908808521","0.0159146805897042","0.127186326473617","0.12512886432808","0.45711819165657","0.456980171048196","0.457118191656568",NA,"0.623259786362604",NA,"0.740194562509288","0.789468040114737",NA,"0.86034560643342","0.457282107420217","0.000301936372021208","224","26",NA,"no_exp","0.0113309274448156"
@@ -63,8 +62,6 @@
 "aclew","cougar","cp_dur","1.95495129651426","0.391304563746481","0.10731658932791","3.64626351058207","0.654337803019238","0.525249005764223","0.654337803019238",NA,"0.66150490252097",NA,"0.349448307684311","0.813329516568143",NA,"0.591141529317905","0.722530588242532","0.197281582478309","233","26",NA,"no_exp","0.000182435698517968"
 "aclew","cougar","cp_dur","1.95495129651426","0.391304563746481","0.10731658932791","3.64626351058207","0.654337803019238","0.525249005764223","0.654337803019238",NA,"0.66150490252097",NA,"0.349448307684311","0.813329516568143",NA,"0.591141529317905","0.722530588242532","0.197281582478309","233","26",NA,"no_exp","0.000182435698517968"
 "aclew","cougar","avg_can_voc_dur_chi","1.01532660398983","0.00864855052031282","0.10255215357529","0.0843331926127072","0.390590848890129","0.390541888353579","0.390590848890129",NA,"0.366093644602998",NA,"0.571188029156793","0.60505672841726",NA,"0.755769825513557","0.390667238286096","0.000125349932516529","234","26",NA,"no_exp","3.45746760239628e-08"
 "aclew","cougar","avg_can_voc_dur_chi","1.01532660398983","0.00864855052031282","0.10255215357529","0.0843331926127072","0.390590848890129","0.390541888353579","0.390590848890129",NA,"0.366093644602998",NA,"0.571188029156793","0.60505672841726",NA,"0.755769825513557","0.390667238286096","0.000125349932516529","234","26",NA,"no_exp","3.45746760239628e-08"
 "aclew","cougar","can_voc_chi_ph","2.62593960685623","0.612968988721072","0.109934184104102","5.57578148886447","0.688421927317704","0.421653291283147","0.688421927317703",NA,"0.680918524583675",NA,"0.308182051042578","0.825177874511717",NA,"0.555141469395484","0.809160756470909","0.387507465187762","205","26",NA,"no_exp","0.0625213363656742"
 "aclew","cougar","can_voc_chi_ph","2.62593960685623","0.612968988721072","0.109934184104102","5.57578148886447","0.688421927317704","0.421653291283147","0.688421927317703",NA,"0.680918524583675",NA,"0.308182051042578","0.825177874511717",NA,"0.555141469395484","0.809160756470909","0.387507465187762","205","26",NA,"no_exp","0.0625213363656742"
-"aclew","cougar","voc_chi","1.86985212713741","0.503926758673233","0.0845689124041119","5.95877071547548","0.401523478536018","0.242259655587314","0.401523478536019",NA,"0.254480370093469",NA,"0.379306652825643","0.50446047426282",NA,"0.615878764714","0.638908497964827","0.396648842377512","234","26",NA,"no_exp","0.000796685253703539"
-"aclew","cougar","simple_CTC","2.14910353837793","0.537042602475418","0.0830147228790606","6.46924525975717","0.453041076677579","0.250395873606989","0.453041076677581",NA,"0.266160461723405",NA,"0.32133695390901","0.515907415844553",NA,"0.566865904697936","0.697695717931721","0.447299844324732","230","26",NA,"no_exp","1.75578903607078e-05"
 "aclew","cougar","peak_voc_chi","1.7277319342304","0.423358034322285","0.109614810780442","3.86223386518697","0.457296728841431","0.349988416146647","0.457296728841434",NA,"0.458314177462757",NA,"0.543910742500922","0.676989052690482",NA,"0.737503045757048","0.584646365628708","0.234657949482061","216","25",NA,"no_exp","0.00109794205881491"
 "aclew","cougar","peak_voc_chi","1.7277319342304","0.423358034322285","0.109614810780442","3.86223386518697","0.457296728841431","0.349988416146647","0.457296728841434",NA,"0.458314177462757",NA,"0.543910742500922","0.676989052690482",NA,"0.737503045757048","0.584646365628708","0.234657949482061","216","25",NA,"no_exp","0.00109794205881491"
 "aclew","cougar","voc_fem_ph","1.56349464638589","0.312695629115315","0.11601177617457","2.69537834370179","0.502804116079798","0.440954751567658","0.502804116079797",NA,"0.572770056572988",NA,"0.566381430568152","0.756815734887289",NA,"0.752583171860859","0.56396361830956","0.123008866741902","233","26",NA,"no_exp","0.000432040760422613"
 "aclew","cougar","voc_fem_ph","1.56349464638589","0.312695629115315","0.11601177617457","2.69537834370179","0.502804116079798","0.440954751567658","0.502804116079797",NA,"0.572770056572988",NA,"0.566381430568152","0.756815734887289",NA,"0.752583171860859","0.56396361830956","0.123008866741902","233","26",NA,"no_exp","0.000432040760422613"
 "aclew","cougar","peak_voc_fem_ph","1.37043785943857","0.217057745595068","0.111994640399293","1.93810833108794","0.213244651332588","0.201896867155907","0.213244651332588",NA,"0.305082422687598",NA,"1.12558615812372","0.552342667813739",NA,"1.06093645338621","0.255111726735116","0.0532148595792088","222","26",NA,"no_exp","0.278126322661811"
 "aclew","cougar","peak_voc_fem_ph","1.37043785943857","0.217057745595068","0.111994640399293","1.93810833108794","0.213244651332588","0.201896867155907","0.213244651332588",NA,"0.305082422687598",NA,"1.12558615812372","0.552342667813739",NA,"1.06093645338621","0.255111726735116","0.0532148595792088","222","26",NA,"no_exp","0.278126322661811"
@@ -83,6 +80,7 @@
 "aclew","cougar","avg_voc_dur_och","1.63973451409339","0.489856353088166","0.0981270668194186","4.9920615072459","0.432043600482501","0.294553494473159","0.4320436004825",NA,"0.36432260588206",NA,"0.478931652427031","0.603591422969263",NA,"0.692048880085092","0.612785510537729","0.31823201606457","235","26",NA,"no_exp","0.00133159121953514"
 "aclew","cougar","avg_voc_dur_och","1.63973451409339","0.489856353088166","0.0981270668194186","4.9920615072459","0.432043600482501","0.294553494473159","0.4320436004825",NA,"0.36432260588206",NA,"0.478931652427031","0.603591422969263",NA,"0.692048880085092","0.612785510537729","0.31823201606457","235","26",NA,"no_exp","0.00133159121953514"
 "aclew","cougar","avg_voc_dur_chi","1.33180047908353","0.161845242515986","0.110413933506675","1.46580451738187","0.52710482233364","0.506273901251505","0.527104822333638",NA,"0.539585066819904",NA,"0.484091902081673","0.734564542310547",NA,"0.69576713207917","0.545793405151908","0.0395195039004027","233","26",NA,"no_exp","0.000103895917896805"
 "aclew","cougar","avg_voc_dur_chi","1.33180047908353","0.161845242515986","0.110413933506675","1.46580451738187","0.52710482233364","0.506273901251505","0.527104822333638",NA,"0.539585066819904",NA,"0.484091902081673","0.734564542310547",NA,"0.69576713207917","0.545793405151908","0.0395195039004027","233","26",NA,"no_exp","0.000103895917896805"
 "aclew","cougar","voc_dur_fem_ph","1.40366457941321","0.12583900985638","0.119839163107541","1.0500658265066","0.452662552791202","0.443479732665047","0.452662552791203",NA,"0.56013449605442",NA,"0.677287271221281","0.748421335916087",NA,"0.822974647982112","0.463765970326041","0.0202862376609946","231","26",NA,"no_exp","0.0584758394284575"
 "aclew","cougar","voc_dur_fem_ph","1.40366457941321","0.12583900985638","0.119839163107541","1.0500658265066","0.452662552791202","0.443479732665047","0.452662552791203",NA,"0.56013449605442",NA,"0.677287271221281","0.748421335916087",NA,"0.822974647982112","0.463765970326041","0.0202862376609946","231","26",NA,"no_exp","0.0584758394284575"
+"aclew","cougar","simple_CTC_ph","2.34849137603907","0.508042842316993","0.0904900950918595","5.61434753495685","0.600813324805563","0.368455173708685","0.600813324805561",NA,"0.406097483905676",NA,"0.269815428040974","0.637257784499865",NA,"0.519437607457309","0.755194517700556","0.386739343991871","218","26",NA,"no_exp","0.0138571922672675"
 "aclew","fausey-trio","wc_adu_ph","1.12375755259806","-0.7802715991219","0.681285811687978","-1.14529260074956","0.327631710351316","0.319426848148431","0.327631710351316",NA,"0.180272543096004",NA,"0.369956685029379","0.424585142340148",NA,"0.608240647301197","0.344469791012806","0.0250429428643755","84","28",NA,"no_exp","0.144703436298957"
 "aclew","fausey-trio","wc_adu_ph","1.12375755259806","-0.7802715991219","0.681285811687978","-1.14529260074956","0.327631710351316","0.319426848148431","0.327631710351316",NA,"0.180272543096004",NA,"0.369956685029379","0.424585142340148",NA,"0.608240647301197","0.344469791012806","0.0250429428643755","84","28",NA,"no_exp","0.144703436298957"
 "aclew","fausey-trio","sc_fem_ph","1.00966486396315","-0.329901350827632","0.590772305351501","-0.558423859478899","0.242742896136723","0.241411679034484","0.242742896136723",NA,"0.111218245049679",NA,"0.346954771832497","0.333493995522677",NA,"0.589028668090524","0.246895741074716","0.00548406204023147","84","28",NA,"no_exp","0.240770526323518"
 "aclew","fausey-trio","sc_fem_ph","1.00966486396315","-0.329901350827632","0.590772305351501","-0.558423859478899","0.242742896136723","0.241411679034484","0.242742896136723",NA,"0.111218245049679",NA,"0.346954771832497","0.333493995522677",NA,"0.589028668090524","0.246895741074716","0.00548406204023147","84","28",NA,"no_exp","0.240770526323518"
 "aclew","fausey-trio","sc_mal_ph","0.892278022290407","-0.893307350839171","0.699586324475407","-1.27690796630284","0.395607780766179","0.382474218481065","0.395607780766179",NA,"0.213421516169758",NA,"0.326056033428538","0.461975666209551",NA,"0.57101316397132","0.415672661291462","0.0331984428103974","84","28",NA,"no_exp","0.0430018976946938"
 "aclew","fausey-trio","sc_mal_ph","0.892278022290407","-0.893307350839171","0.699586324475407","-1.27690796630284","0.395607780766179","0.382474218481065","0.395607780766179",NA,"0.213421516169758",NA,"0.326056033428538","0.461975666209551",NA,"0.57101316397132","0.415672661291462","0.0331984428103974","84","28",NA,"no_exp","0.0430018976946938"
@@ -105,8 +103,6 @@
 "aclew","fausey-trio","cp_dur","0.704731963141091","-0.568739021112277","0.727043234407532","-0.782262999222794","0.666450989082656","0.655960446049933","0.666450989082656",NA,"0.312914641786232",NA,"0.156609219551189","0.5593877383231",NA,"0.395738827449606","0.671701353040203","0.0157409069902701","84","28",NA,"no_exp","0.900431320256573"
 "aclew","fausey-trio","cp_dur","0.704731963141091","-0.568739021112277","0.727043234407532","-0.782262999222794","0.666450989082656","0.655960446049933","0.666450989082656",NA,"0.312914641786232",NA,"0.156609219551189","0.5593877383231",NA,"0.395738827449606","0.671701353040203","0.0157409069902701","84","28",NA,"no_exp","0.900431320256573"
 "aclew","fausey-trio","avg_can_voc_dur_chi","1.28646697791179","-0.0163804199484597","1.08911833713833","-0.0150400735988887","0.657681496836175","0.65767752339672","0.657681496836175",NA,"0.690458454300225",NA,"0.359378674494983","0.830938297528899",NA,"0.59948200514693","0.65768356498292","6.04158619944677e-06","81","28",NA,"no_exp","0.0625467938527279"
 "aclew","fausey-trio","avg_can_voc_dur_chi","1.28646697791179","-0.0163804199484597","1.08911833713833","-0.0150400735988887","0.657681496836175","0.65767752339672","0.657681496836175",NA,"0.690458454300225",NA,"0.359378674494983","0.830938297528899",NA,"0.59948200514693","0.65768356498292","6.04158619944677e-06","81","28",NA,"no_exp","0.0625467938527279"
 "aclew","fausey-trio","can_voc_chi_ph","0.464887607213079","0.325532336470312","0.361671730217579","0.900076807978534","0.561722416866011","0.550832937762677","0.561722416866011",NA,"0.0698996103816925",NA,"0.0545383829810787","0.264385344491128",NA,"0.233534543442889","0.570218810172913","0.0193858724102359","84","28",NA,"no_exp","0.00632655225762406"
 "aclew","fausey-trio","can_voc_chi_ph","0.464887607213079","0.325532336470312","0.361671730217579","0.900076807978534","0.561722416866011","0.550832937762677","0.561722416866011",NA,"0.0698996103816925",NA,"0.0545383829810787","0.264385344491128",NA,"0.233534543442889","0.570218810172913","0.0193858724102359","84","28",NA,"no_exp","0.00632655225762406"
-"aclew","fausey-trio","voc_chi","0.826480373006574","0.637203917922525","0.63039782701915","1.01079650121187","0.433701223478447","0.424223690813402","0.433701223478447",NA,"0.182978087176587",NA,"0.238920854470462","0.427759379998367",NA,"0.48879530937854","0.4460763676148","0.0218526768013977","84","28",NA,"no_exp","0.205646653766118"
-"aclew","fausey-trio","simple_CTC","0.672002144730323","0.762298405790837","0.486668792026473","1.56635974667011","0.412090064833244","0.391522685741941","0.412090064833244",NA,"0.105821052893767",NA,"0.150970027319702","0.325301480005497",NA,"0.388548616417176","0.441432598274352","0.0499099125324111","84","28",NA,"no_exp","0.495672807028776"
 "aclew","fausey-trio","peak_voc_chi","1.056301000952","1.57461958088359","0.69051067749432","2.28036963396057","0.440447537481759","0.395219376152656","0.440447537481758",NA,"0.221527022476784",NA,"0.281431908213024","0.470666572508378",NA,"0.530501562875194","0.497906205979638","0.102686829826982","84","28",NA,"no_exp","0.916946775512316"
 "aclew","fausey-trio","peak_voc_chi","1.056301000952","1.57461958088359","0.69051067749432","2.28036963396057","0.440447537481759","0.395219376152656","0.440447537481758",NA,"0.221527022476784",NA,"0.281431908213024","0.470666572508378",NA,"0.530501562875194","0.497906205979638","0.102686829826982","84","28",NA,"no_exp","0.916946775512316"
 "aclew","fausey-trio","voc_fem_ph","1.07852991517852","0.107223930526101","0.61846136359693","0.173372075989507","0.236801408765964","0.236676568447259","0.236801408765965",NA,"0.119817445481889",NA,"0.386165378295596","0.346146566474217",NA,"0.621422061320321","0.237203762602716","0.000527194155457842","84","28",NA,"no_exp","0.466199660658598"
 "aclew","fausey-trio","voc_fem_ph","1.07852991517852","0.107223930526101","0.61846136359693","0.173372075989507","0.236801408765964","0.236676568447259","0.236801408765965",NA,"0.119817445481889",NA,"0.386165378295596","0.346146566474217",NA,"0.621422061320321","0.237203762602716","0.000527194155457842","84","28",NA,"no_exp","0.466199660658598"
 "aclew","fausey-trio","peak_voc_fem_ph","1.07085376923572","0.088750236327799","0.820337789072234","0.10818742902015","0.486782138441897","0.486651384350927","0.486782138441897",NA,"0.33127470878782",NA,"0.349265275378755","0.57556468688395",NA,"0.590986696448198","0.486919993407514","0.000268609056587029","84","28",NA,"no_exp","0.610946081012489"
 "aclew","fausey-trio","peak_voc_fem_ph","1.07085376923572","0.088750236327799","0.820337789072234","0.10818742902015","0.486782138441897","0.486651384350927","0.486782138441897",NA,"0.33127470878782",NA,"0.349265275378755","0.57556468688395",NA,"0.590986696448198","0.486919993407514","0.000268609056587029","84","28",NA,"no_exp","0.610946081012489"
@@ -125,6 +121,7 @@
 "aclew","fausey-trio","avg_voc_dur_och","1.48206891067826","1.75919284794745","1.02140342577304","1.72232910479621","0.685581864962731","0.635801333258539","0.685581864962731",NA,"0.629071570614187",NA,"0.288501665732115","0.793140322146206",NA,"0.53712351068643","0.708411964093849","0.0726106308353094","84","28",NA,"no_exp","0.0199664225144248"
 "aclew","fausey-trio","avg_voc_dur_och","1.48206891067826","1.75919284794745","1.02140342577304","1.72232910479621","0.685581864962731","0.635801333258539","0.685581864962731",NA,"0.629071570614187",NA,"0.288501665732115","0.793140322146206",NA,"0.53712351068643","0.708411964093849","0.0726106308353094","84","28",NA,"no_exp","0.0199664225144248"
 "aclew","fausey-trio","avg_voc_dur_chi","1.47191697526344","-0.023546961085671","1.00093935198654","-0.0235248629589174","0.592489209100982","0.592481026800432","0.592489209100982",NA,"0.552206010739664",NA,"0.379804230556643","0.743105652474575",NA,"0.616282589853585","0.592494836841905","1.38100414727298e-05","84","28",NA,"no_exp","0.0315408948321885"
 "aclew","fausey-trio","avg_voc_dur_chi","1.47191697526344","-0.023546961085671","1.00093935198654","-0.0235248629589174","0.592489209100982","0.592481026800432","0.592489209100982",NA,"0.552206010739664",NA,"0.379804230556643","0.743105652474575",NA,"0.616282589853585","0.592494836841905","1.38100414727298e-05","84","28",NA,"no_exp","0.0315408948321885"
 "aclew","fausey-trio","voc_dur_fem_ph","1.12732218149292","-0.544681975110106","0.625353541345261","-0.870998465825245","0.239553957918097","0.23639562409141","0.239553957918097",NA,"0.123487412904666",NA,"0.392001514841984","0.351407758742839",NA,"0.626100243445076","0.249579851370038","0.0131842272786282","84","28",NA,"no_exp","0.275539715521177"
 "aclew","fausey-trio","voc_dur_fem_ph","1.12732218149292","-0.544681975110106","0.625353541345261","-0.870998465825245","0.239553957918097","0.23639562409141","0.239553957918097",NA,"0.123487412904666",NA,"0.392001514841984","0.351407758742839",NA,"0.626100243445076","0.249579851370038","0.0131842272786282","84","28",NA,"no_exp","0.275539715521177"
+"aclew","fausey-trio","simple_CTC_ph","0.770202543800538","1.1437917323401","0.448310680105935","2.55133723798377","0.283115899497122","0.25255048789619","0.283115899497122",NA,"0.0710441073578979",NA,"0.179892373016706","0.26654100502155",NA,"0.424137210129819","0.360511261753199","0.107960773857009","84","28",NA,"no_exp","0.499236392751216"
 "aclew","lucid","wc_adu_ph","1.17063990502602","-0.0105334375796715","0.0837494595808636","-0.125773200596011","0.24410746520945","0.244094631740752","0.244107465209449",NA,"0.152192179645338",NA,"0.471271668601803","0.390118161132417",NA,"0.686492293184565","0.244147204769141","5.25730283894597e-05","231","35",NA,"no_exp","0.00791096911992592"
 "aclew","lucid","wc_adu_ph","1.17063990502602","-0.0105334375796715","0.0837494595808636","-0.125773200596011","0.24410746520945","0.244094631740752","0.244107465209449",NA,"0.152192179645338",NA,"0.471271668601803","0.390118161132417",NA,"0.686492293184565","0.244147204769141","5.25730283894597e-05","231","35",NA,"no_exp","0.00791096911992592"
 "aclew","lucid","sc_fem_ph","1.2058856318724","-0.0382779463168108","0.0826163660311725","-0.463321592992457","0.343382215045302","0.343170035673393","0.343382215045301",NA,"0.23936132010081",NA,"0.457708328859408","0.489245664365879",NA,"0.676541446520025","0.343787945869705","0.00061791019631243","232","35",NA,"no_exp","0.00723993124948715"
 "aclew","lucid","sc_fem_ph","1.2058856318724","-0.0382779463168108","0.0826163660311725","-0.463321592992457","0.343382215045302","0.343170035673393","0.343382215045301",NA,"0.23936132010081",NA,"0.457708328859408","0.489245664365879",NA,"0.676541446520025","0.343787945869705","0.00061791019631243","232","35",NA,"no_exp","0.00723993124948715"
 "aclew","lucid","sc_mal_ph","1.11931900645209","0.0515076801170517","0.0881881883704311","0.584065520211115","0.305857417012861","0.305541707681616","0.305857417012861",NA,"0.230327495748263",NA,"0.522727630387775","0.479924468795104",NA,"0.722999052826333","0.306573918488626","0.00103221080700911","233","35",NA,"no_exp","0.00106864442252252"
 "aclew","lucid","sc_mal_ph","1.11931900645209","0.0515076801170517","0.0881881883704311","0.584065520211115","0.305857417012861","0.305541707681616","0.305857417012861",NA,"0.230327495748263",NA,"0.522727630387775","0.479924468795104",NA,"0.722999052826333","0.306573918488626","0.00103221080700911","233","35",NA,"no_exp","0.00106864442252252"
@@ -147,8 +144,6 @@
 "aclew","lucid","cp_dur","1.36548077117115","0.800503382435534","0.0777373038480027","10.2975449727551","0.407734380684215","0.319349661690653","0.407734380684215",NA,"0.274017194001822",NA,"0.398031097687479","0.523466516600462",NA,"0.630897057916328","0.536119998411447","0.216770336720794","232","35",NA,"no_exp","0.452966734484049"
 "aclew","lucid","cp_dur","1.36548077117115","0.800503382435534","0.0777373038480027","10.2975449727551","0.407734380684215","0.319349661690653","0.407734380684215",NA,"0.274017194001822",NA,"0.398031097687479","0.523466516600462",NA,"0.630897057916328","0.536119998411447","0.216770336720794","232","35",NA,"no_exp","0.452966734484049"
 "aclew","lucid","avg_can_voc_dur_chi","1.37840899483821","0.463719637811064","0.0892831822930552","5.19380723111987","0.345949699130802","0.321304160728958","0.345949699130802",NA,"0.283676617250763",NA,"0.536317208335731","0.532613008901175",NA,"0.732336813451114","0.3925443972829","0.071240236553942","234","35",NA,"no_exp","0.0348928161468888"
 "aclew","lucid","avg_can_voc_dur_chi","1.37840899483821","0.463719637811064","0.0892831822930552","5.19380723111987","0.345949699130802","0.321304160728958","0.345949699130802",NA,"0.283676617250763",NA,"0.536317208335731","0.532613008901175",NA,"0.732336813451114","0.3925443972829","0.071240236553942","234","35",NA,"no_exp","0.0348928161468888"
 "aclew","lucid","can_voc_chi_ph","1.40120920630839","0.954079392262859","0.0752423045947578","12.6800926340756","0.356702932294251","0.245061074848214","0.35670293229425",NA,"0.207043655582507",NA,"0.373393556556004","0.455020500178296",NA,"0.611059372365733","0.558043804561078","0.312982729712864","232","35",NA,"no_exp","0.0223835129929461"
 "aclew","lucid","can_voc_chi_ph","1.40120920630839","0.954079392262859","0.0752423045947578","12.6800926340756","0.356702932294251","0.245061074848214","0.35670293229425",NA,"0.207043655582507",NA,"0.373393556556004","0.455020500178296",NA,"0.611059372365733","0.558043804561078","0.312982729712864","232","35",NA,"no_exp","0.0223835129929461"
-"aclew","lucid","voc_chi","1.13366354054601","0.651957946506402","0.0765045228606353","8.52182226786831","0.304931066433748","0.249071365960334","0.304931066433748",NA,"0.165953723291449",NA,"0.378279848027875","0.407374180933756",NA,"0.615044590276083","0.43225932751082","0.183187961550486","230","35",NA,"no_exp","0.509635169810244"
-"aclew","lucid","simple_CTC","1.27903552495395","0.867411076651309","0.074247109456808","11.6827588709822","0.308574487832083","0.217420650863266","0.308574487832082",NA,"0.158298139384924",NA,"0.354700004100825","0.397866987050854",NA,"0.595566960215915","0.512823675297418","0.295403024434152","230","35",NA,"no_exp","0.65031188542"
 "aclew","lucid","peak_voc_chi","1.0165589830944","0.669041193506716","0.0684378472521982","9.77589477707055","0.279805621236077","0.215632984323748","0.279805621236079",NA,"0.122583651672795",NA,"0.315519239653211","0.350119481995497",NA,"0.561710992996586","0.444980188389335","0.229347204065587","235","35",NA,"no_exp","0.162533786105045"
 "aclew","lucid","peak_voc_chi","1.0165589830944","0.669041193506716","0.0684378472521982","9.77589477707055","0.279805621236077","0.215632984323748","0.279805621236079",NA,"0.122583651672795",NA,"0.315519239653211","0.350119481995497",NA,"0.561710992996586","0.444980188389335","0.229347204065587","235","35",NA,"no_exp","0.162533786105045"
 "aclew","lucid","voc_fem_ph","1.12291605957702","0.0431951640345368","0.0764793472614779","0.564795145110946","0.306128463362902","0.305831723571528","0.306128463362902",NA,"0.173327122514",NA,"0.392863687089118","0.416325740873657",NA,"0.626788390997407","0.306801054512254","0.000969330940725772","232","35",NA,"no_exp","0.434300020013938"
 "aclew","lucid","voc_fem_ph","1.12291605957702","0.0431951640345368","0.0764793472614779","0.564795145110946","0.306128463362902","0.305831723571528","0.306128463362902",NA,"0.173327122514",NA,"0.392863687089118","0.416325740873657",NA,"0.626788390997407","0.306801054512254","0.000969330940725772","232","35",NA,"no_exp","0.434300020013938"
 "aclew","lucid","peak_voc_fem_ph","0.939121757940849","-0.0488213174338627","0.0768984487058063","-0.634880394280001","0.165034173844561","0.164795065878227","0.165034173844561",NA,"0.0789674520494098",NA,"0.399524064039772","0.28101148028045",NA,"0.632079159630953","0.166243904992964","0.00144883911473771","235","35",NA,"no_exp","0.0262391520186003"
 "aclew","lucid","peak_voc_fem_ph","0.939121757940849","-0.0488213174338627","0.0768984487058063","-0.634880394280001","0.165034173844561","0.164795065878227","0.165034173844561",NA,"0.0789674520494098",NA,"0.399524064039772","0.28101148028045",NA,"0.632079159630953","0.166243904992964","0.00144883911473771","235","35",NA,"no_exp","0.0262391520186003"
@@ -167,6 +162,7 @@
 "aclew","lucid","avg_voc_dur_och","1.35325765675588","0.369181485811186","0.06851253074798","5.38852501550704","0.589313298756459","0.560175270088086","0.589313298756462",NA,"0.44998064350512",NA,"0.313587130130138","0.670805965615334",NA,"0.559988508926869","0.609619307291826","0.0494440372037404","234","35",NA,"no_exp","0.276522643197331"
 "aclew","lucid","avg_voc_dur_och","1.35325765675588","0.369181485811186","0.06851253074798","5.38852501550704","0.589313298756459","0.560175270088086","0.589313298756462",NA,"0.44998064350512",NA,"0.313587130130138","0.670805965615334",NA,"0.559988508926869","0.609619307291826","0.0494440372037404","234","35",NA,"no_exp","0.276522643197331"
 "aclew","lucid","avg_voc_dur_chi","1.52937315484221","0.708225481427128","0.0845127591815481","8.38010128039645","0.44734003714998","0.381784761429885","0.447340037149981",NA,"0.381575221707622",NA,"0.471411745742578","0.617717752462742",NA,"0.686594309430669","0.528329381352015","0.146544619922129","231","35",NA,"no_exp","0.374567993666282"
 "aclew","lucid","avg_voc_dur_chi","1.52937315484221","0.708225481427128","0.0845127591815481","8.38010128039645","0.44734003714998","0.381784761429885","0.447340037149981",NA,"0.381575221707622",NA,"0.471411745742578","0.617717752462742",NA,"0.686594309430669","0.528329381352015","0.146544619922129","231","35",NA,"no_exp","0.374567993666282"
 "aclew","lucid","voc_dur_fem_ph","1.29556450231222","-0.0997201664703509","0.0867439427440311","-1.14959227487054","0.373856025777371","0.37249151013829","0.373856025777371",NA,"0.301001085161508",NA,"0.504124589984765","0.548635657938407",NA,"0.710017316679506","0.37614135271136","0.00364984257307058","230","35",NA,"no_exp","0.0332588945249874"
 "aclew","lucid","voc_dur_fem_ph","1.29556450231222","-0.0997201664703509","0.0867439427440311","-1.14959227487054","0.373856025777371","0.37249151013829","0.373856025777371",NA,"0.301001085161508",NA,"0.504124589984765","0.548635657938407",NA,"0.710017316679506","0.37614135271136","0.00364984257307058","230","35",NA,"no_exp","0.0332588945249874"
+"aclew","lucid","simple_CTC_ph","1.22964300015822","0.736725418207367","0.069941123996449","10.5335084155178","0.359131649987017","0.274588584132291","0.359131649987019",NA,"0.184405796212354",NA,"0.329071075622863","0.429424959931714",NA,"0.573647169977211","0.509998261496519","0.235409677364228","235","35",NA,"no_exp","0.564808978648138"
 "aclew","lyon","wc_adu_ph","0.784238126254885",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","lyon","wc_adu_ph","0.784238126254885",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","lyon","sc_fem_ph","1.13013860346984","0.251288933262933","0.13510685200997","1.85992737988144","0.0918135872209948","0.0848478003487453","0.0918135872209949",NA,"0.0793035728217101",NA,"0.784441927403946","0.281608900466072",NA,"0.885687262753589","0.160716602375649","0.0758688020269041","54","16",NA,"no_exp","0.185028371477049"
 "aclew","lyon","sc_fem_ph","1.13013860346984","0.251288933262933","0.13510685200997","1.85992737988144","0.0918135872209948","0.0848478003487453","0.0918135872209949",NA,"0.0793035728217101",NA,"0.784441927403946","0.281608900466072",NA,"0.885687262753589","0.160716602375649","0.0758688020269041","54","16",NA,"no_exp","0.185028371477049"
 "aclew","lyon","sc_mal_ph","1.37521655744894","0.0159451656908636","0.143118924776453","0.111412000305127","0.144938593468635","0.144891091279612","0.144938593468635",NA,"0.126223100089299",NA,"0.744649847333183","0.355278904649993",NA,"0.862930963248615","0.145218831378963","0.000327740099351981","54","16",NA,"no_exp","0.0236787333431287"
 "aclew","lyon","sc_mal_ph","1.37521655744894","0.0159451656908636","0.143118924776453","0.111412000305127","0.144938593468635","0.144891091279612","0.144938593468635",NA,"0.126223100089299",NA,"0.744649847333183","0.355278904649993",NA,"0.862930963248615","0.145218831378963","0.000327740099351981","54","16",NA,"no_exp","0.0236787333431287"
@@ -189,8 +185,6 @@
 "aclew","lyon","cp_dur","1.576180188068","0.549920557405478","0.162473693281803","3.3846744435831","0.295930940391162","0.213612633865957","0.295930940391162",NA,"0.260789113946074",NA,"0.620460793891756","0.510675155011553",NA,"0.787693337468177","0.49177991984287","0.278167285976913","54","16",NA,"no_exp","0.707038209238824"
 "aclew","lyon","cp_dur","1.576180188068","0.549920557405478","0.162473693281803","3.3846744435831","0.295930940391162","0.213612633865957","0.295930940391162",NA,"0.260789113946074",NA,"0.620460793891756","0.510675155011553",NA,"0.787693337468177","0.49177991984287","0.278167285976913","54","16",NA,"no_exp","0.707038209238824"
 "aclew","lyon","avg_can_voc_dur_chi","1.70462175832035","0.0160464016424373","0.275103935381622","0.058328506352255","0.727991582722126","0.727869590425897","0.727991582722126",NA,"1.22210261492808",NA,"0.456629178039031","1.10548750102752",NA,"0.675743426190023","0.728037164198898","0.00016757377300053","50","16",NA,"no_exp","0.617853650978208"
 "aclew","lyon","avg_can_voc_dur_chi","1.70462175832035","0.0160464016424373","0.275103935381622","0.058328506352255","0.727991582722126","0.727869590425897","0.727991582722126",NA,"1.22210261492808",NA,"0.456629178039031","1.10548750102752",NA,"0.675743426190023","0.728037164198898","0.00016757377300053","50","16",NA,"no_exp","0.617853650978208"
 "aclew","lyon","can_voc_chi_ph","1.1083322477253","0.624408741358823","0.142479099838728","4.38245849437278","0.400303016404477","0.228779081606632","0.400303016404476",NA,"0.238260562167818",NA,"0.356939954450506","0.48811941384032",NA,"0.597444519976965","0.657264323457851","0.428485241851219","53","16",NA,"no_exp","0.0118520069554767"
 "aclew","lyon","can_voc_chi_ph","1.1083322477253","0.624408741358823","0.142479099838728","4.38245849437278","0.400303016404477","0.228779081606632","0.400303016404476",NA,"0.238260562167818",NA,"0.356939954450506","0.48811941384032",NA,"0.597444519976965","0.657264323457851","0.428485241851219","53","16",NA,"no_exp","0.0118520069554767"
-"aclew","lyon","voc_chi","1.45852287791276","0.360257396223381","0.15650400426573","2.30190529573733","0.48645598675142","0.398141387916234","0.48645598675142",NA,"0.31962655712578",NA,"0.337424781188019","0.565355248605494",NA,"0.580882760277854","0.579688334074623","0.181546946158389","54","16",NA,"no_exp","0.0296651460486513"
-"aclew","lyon","simple_CTC","1.3287988339378","0.491482701780092","0.123949527663574","3.96518414425977","0.383462239046216","0.241079369206092","0.383462239046216",NA,"0.17612055651091",NA,"0.283169925255884","0.419667197325346",NA,"0.532137130123321","0.612388080578227","0.371308711372134","54","16",NA,"no_exp","0.898571188865062"
 "aclew","lyon","peak_voc_chi","1.4725463458816","0.563524281449565","0.156764177068456","3.5947261165635","0.41258874610548","0.27476116317035","0.41258874610548",NA,"0.293312464449185",NA,"0.417595109297867","0.541583294100903",NA,"0.646215992759284","0.608816767536964","0.334055604366614","54","16",NA,"no_exp","0.0325202008250231"
 "aclew","lyon","peak_voc_chi","1.4725463458816","0.563524281449565","0.156764177068456","3.5947261165635","0.41258874610548","0.27476116317035","0.41258874610548",NA,"0.293312464449185",NA,"0.417595109297867","0.541583294100903",NA,"0.646215992759284","0.608816767536964","0.334055604366614","54","16",NA,"no_exp","0.0325202008250231"
 "aclew","lyon","voc_fem_ph","1.25989464374552","0.401786879169795","0.0973124714613074","4.12883233912675","0.0041749477741808","0.00314957320526611","0.0041749477741808",NA,"0.00232477207222055",NA,"0.554513827585883","0.0482158902460647",NA,"0.744656852238588","0.248751344622847","0.245601771417581","54","16",NA,"no_exp","0.663669558061325"
 "aclew","lyon","voc_fem_ph","1.25989464374552","0.401786879169795","0.0973124714613074","4.12883233912675","0.0041749477741808","0.00314957320526611","0.0041749477741808",NA,"0.00232477207222055",NA,"0.554513827585883","0.0482158902460647",NA,"0.744656852238588","0.248751344622847","0.245601771417581","54","16",NA,"no_exp","0.663669558061325"
 "aclew","lyon","peak_voc_fem_ph","1.14096919460234",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","lyon","peak_voc_fem_ph","1.14096919460234",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
@@ -209,6 +203,7 @@
 "aclew","lyon","avg_voc_dur_och","1.76078118075764","0.267055680351869","0.21701757548279","1.2305716703256","0.433493161022902","0.408617771241401","0.433493161022903",NA,"0.554567717644017",NA,"0.724732090305474","0.744693035850354",NA,"0.851311981770181","0.466001351925358","0.0573835806839565","50","16",NA,"no_exp","0.392743266479363"
 "aclew","lyon","avg_voc_dur_och","1.76078118075764","0.267055680351869","0.21701757548279","1.2305716703256","0.433493161022902","0.408617771241401","0.433493161022903",NA,"0.554567717644017",NA,"0.724732090305474","0.744693035850354",NA,"0.851311981770181","0.466001351925358","0.0573835806839565","50","16",NA,"no_exp","0.392743266479363"
 "aclew","lyon","avg_voc_dur_chi","2.10841548259604","-0.117218442515234","0.296101365614451","-0.395872684585528","0.821199360998994","0.814968669079064","0.821199360998993",NA,"1.63031238612027",NA,"0.354969706813882","1.27683686746596",NA,"0.59579334237123","0.822555976395463","0.00758730731639981","52","16",NA,"no_exp","0.691881412462411"
 "aclew","lyon","avg_voc_dur_chi","2.10841548259604","-0.117218442515234","0.296101365614451","-0.395872684585528","0.821199360998994","0.814968669079064","0.821199360998993",NA,"1.63031238612027",NA,"0.354969706813882","1.27683686746596",NA,"0.59579334237123","0.822555976395463","0.00758730731639981","52","16",NA,"no_exp","0.691881412462411"
 "aclew","lyon","voc_dur_fem_ph","1.12421635809737",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","lyon","voc_dur_fem_ph","1.12421635809737",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
+"aclew","lyon","simple_CTC_ph","1.54797651639597","0.503238569244211","0.160044915722019","3.14435836323774","0.544049240669017","0.3789751145296","0.544049240669018",NA,"0.355210994326186",NA,"0.297691294241266","0.595995800594422",NA,"0.545610936695065","0.682392735214863","0.303417620685263","54","16",NA,"no_exp","0.647060202780056"
 "aclew","warlaumont","wc_adu_ph","1.60251500754507","-0.417967959615516","0.401717309656863","-1.04045294929545","0.59972892106284","0.591201367819991","0.599728921062839",NA,"0.735505563749938",NA,"0.490891126352108","0.857616210055487",NA,"0.700636229688494","0.605420380682896","0.0142190128629059","36","13",NA,"no_exp","0.903645295434216"
 "aclew","warlaumont","wc_adu_ph","1.60251500754507","-0.417967959615516","0.401717309656863","-1.04045294929545","0.59972892106284","0.591201367819991","0.599728921062839",NA,"0.735505563749938",NA,"0.490891126352108","0.857616210055487",NA,"0.700636229688494","0.605420380682896","0.0142190128629059","36","13",NA,"no_exp","0.903645295434216"
 "aclew","warlaumont","sc_fem_ph","1.57866487329289","-0.58721767655617","0.421920458256918","-1.39177341383763","0.599714718139425","0.585485033670358","0.599714718139425",NA,"0.837310921765388",NA,"0.558871123529564","0.915046950579799",NA,"0.747576834532454","0.609212456124177","0.0237274224538188","38","13",NA,"no_exp","0.0896868871941703"
 "aclew","warlaumont","sc_fem_ph","1.57866487329289","-0.58721767655617","0.421920458256918","-1.39177341383763","0.599714718139425","0.585485033670358","0.599714718139425",NA,"0.837310921765388",NA,"0.558871123529564","0.915046950579799",NA,"0.747576834532454","0.609212456124177","0.0237274224538188","38","13",NA,"no_exp","0.0896868871941703"
 "aclew","warlaumont","sc_mal_ph","1.2521314930513","-0.358286989391099","0.391588974182786","-0.914956786356956","0.449905912953081","0.443623315074205","0.449905912953081",NA,"0.401312009245185",NA,"0.490678955290185","0.633491917269025",NA,"0.700484800184976","0.457587563371451","0.013964248297245","38","13",NA,"no_exp","0.157941419463455"
 "aclew","warlaumont","sc_mal_ph","1.2521314930513","-0.358286989391099","0.391588974182786","-0.914956786356956","0.449905912953081","0.443623315074205","0.449905912953081",NA,"0.401312009245185",NA,"0.490678955290185","0.633491917269025",NA,"0.700484800184976","0.457587563371451","0.013964248297245","38","13",NA,"no_exp","0.157941419463455"
@@ -231,8 +226,6 @@
 "aclew","warlaumont","cp_dur","1.23020999829778","0.0824065796187924","0.442226887377321","0.186344571013116","0.00647313551208899","0.0064670834451202","0.00647313551208899",NA,"0.00462238905249058",NA,"0.709465713051656","0.0679881537658626",NA,"0.842297876675263","0.00740203482339552","0.000934951378275318","38","13",NA,"no_exp","0.0164171398515591"
 "aclew","warlaumont","cp_dur","1.23020999829778","0.0824065796187924","0.442226887377321","0.186344571013116","0.00647313551208899","0.0064670834451202","0.00647313551208899",NA,"0.00462238905249058",NA,"0.709465713051656","0.0679881537658626",NA,"0.842297876675263","0.00740203482339552","0.000934951378275318","38","13",NA,"no_exp","0.0164171398515591"
 "aclew","warlaumont","avg_can_voc_dur_chi","1.88168889892545",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","warlaumont","avg_can_voc_dur_chi","1.88168889892545",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","warlaumont","can_voc_chi_ph","0.784701303476259","0.161369374313852","0.263259262084101","0.612967509809023","0.015993419513051","0.0158337993462231","0.015993419513051",NA,"0.00406540873631619",NA,"0.250127181722449","0.0637605578419464",NA,"0.500127165551371","0.025814164501883","0.00998036515565991","38","13",NA,"no_exp","0.0187500670111881"
 "aclew","warlaumont","can_voc_chi_ph","0.784701303476259","0.161369374313852","0.263259262084101","0.612967509809023","0.015993419513051","0.0158337993462231","0.015993419513051",NA,"0.00406540873631619",NA,"0.250127181722449","0.0637605578419464",NA,"0.500127165551371","0.025814164501883","0.00998036515565991","38","13",NA,"no_exp","0.0187500670111881"
-"aclew","warlaumont","voc_chi","0.82695810732623","0.0496627127059261","0.25364507831281","0.195796082605944","0.583361649466287","0.5830702646882","0.583361649466287",NA,"0.283319237834181",NA,"0.202347308969826","0.532277406841753",NA,"0.449830311306192","0.583569757204298","0.000499492516098072","38","13",NA,"no_exp","0.184782441069022"
-"aclew","warlaumont","simple_CTC","0.673976879213808","0.138294364590589","0.196162859427363","0.704997699331548","0.649812631869415","0.646268129037938","0.649812631869415",NA,"0.222986108059001",NA,"0.120168360048987","0.472214048985205",NA,"0.346653083137864","0.651722782668294","0.00545465363035638","38","13",NA,"no_exp","0.00405295739718954"
 "aclew","warlaumont","peak_voc_chi","0.617047119368001","0.0767791946027019","0.392654440726269","0.19553884189031","0.16135617389147","0.161193887823362","0.16135617389147",NA,"0.0937265293696915",NA,"0.487140797298161","0.306147888069951",NA,"0.697954724389885","0.162199650814605","0.00100576299124282","36","13",NA,"no_exp","0.00431603717538058"
 "aclew","warlaumont","peak_voc_chi","0.617047119368001","0.0767791946027019","0.392654440726269","0.19553884189031","0.16135617389147","0.161193887823362","0.16135617389147",NA,"0.0937265293696915",NA,"0.487140797298161","0.306147888069951",NA,"0.697954724389885","0.162199650814605","0.00100576299124282","36","13",NA,"no_exp","0.00431603717538058"
 "aclew","warlaumont","voc_fem_ph","1.41894038453439","-0.193958019433675","0.317172210456275","-0.611522740768029","0.643196434758663","0.64043575388615","0.643196434758663",NA,"0.56571076566069",NA,"0.313819553677839","0.752137464603838",NA,"0.560195995770979","0.64472788102387","0.0042921271377203","37","13",NA,"no_exp","0.597591999493347"
 "aclew","warlaumont","voc_fem_ph","1.41894038453439","-0.193958019433675","0.317172210456275","-0.611522740768029","0.643196434758663","0.64043575388615","0.643196434758663",NA,"0.56571076566069",NA,"0.313819553677839","0.752137464603838",NA,"0.560195995770979","0.64472788102387","0.0042921271377203","37","13",NA,"no_exp","0.597591999493347"
 "aclew","warlaumont","peak_voc_fem_ph","1.67427136936061","-0.314777958924871","0.537357746196227","-0.585788445692049","0.560061858159304","0.556899716454289","0.560061858159304",NA,"0.99544958233346",NA,"0.78194262502931","0.997722196973416",NA,"0.88427519756539","0.562545774401188","0.00564605794689881","34","13",NA,"no_exp","0.673194192987137"
 "aclew","warlaumont","peak_voc_fem_ph","1.67427136936061","-0.314777958924871","0.537357746196227","-0.585788445692049","0.560061858159304","0.556899716454289","0.560061858159304",NA,"0.99544958233346",NA,"0.78194262502931","0.997722196973416",NA,"0.88427519756539","0.562545774401188","0.00564605794689881","34","13",NA,"no_exp","0.673194192987137"
@@ -251,6 +244,7 @@
 "aclew","warlaumont","avg_voc_dur_och","1.44124711942263","0.655190642806743","0.25985382595397","2.52138155134496","0.768824834971718","0.734439290274182","0.768824834971719",NA,"0.693690984859359",NA,"0.208583438787318","0.832881134892224",NA,"0.456709359207055","0.779164100313391","0.0447248100392086","38","13",NA,"no_exp","0.0490597409106801"
 "aclew","warlaumont","avg_voc_dur_och","1.44124711942263","0.655190642806743","0.25985382595397","2.52138155134496","0.768824834971718","0.734439290274182","0.768824834971719",NA,"0.693690984859359",NA,"0.208583438787318","0.832881134892224",NA,"0.456709359207055","0.779164100313391","0.0447248100392086","38","13",NA,"no_exp","0.0490597409106801"
 "aclew","warlaumont","avg_voc_dur_chi","1.78425503716542",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","warlaumont","avg_voc_dur_chi","1.78425503716542",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","warlaumont","voc_dur_fem_ph","1.63500768083813","-0.458714090166475","0.391375656787176","-1.17205575311475","0.648927348118696","0.639214027485412","0.648927348118696",NA,"0.884264297034411",NA,"0.478391013452934","0.94035328309865",NA,"0.691658162283171","0.654182298835732","0.0149682713503202","38","13",NA,"no_exp","0.0708230988947146"
 "aclew","warlaumont","voc_dur_fem_ph","1.63500768083813","-0.458714090166475","0.391375656787176","-1.17205575311475","0.648927348118696","0.639214027485412","0.648927348118696",NA,"0.884264297034411",NA,"0.478391013452934","0.94035328309865",NA,"0.691658162283171","0.654182298835732","0.0149682713503202","38","13",NA,"no_exp","0.0708230988947146"
+"aclew","warlaumont","simple_CTC_ph","0.77310722033348","0.410999494624527","0.199320569161979","2.06200241326085","0.670229850201931","0.641814980373998","0.670229850201931",NA,"0.251648184096597",NA,"0.12381731333056","0.501645476503673",NA,"0.351876843981755","0.684210689576404","0.0423957092024057","38","13",NA,"no_exp","0.697147423164399"
 "aclew","winnipeg","wc_adu_ph","1.60360536528286","-0.615609520686824","0.5009031858887","-1.22899901224348","0.779122469281485","0.673500167173583","0.779122469281485",NA,"1.06168945034742",NA,"0.300983931831533","1.03038315705732",NA,"0.548620025000485","0.809065891783359","0.135565724609775","34","9",NA,"no_exp","0.948536991262563"
 "aclew","winnipeg","wc_adu_ph","1.60360536528286","-0.615609520686824","0.5009031858887","-1.22899901224348","0.779122469281485","0.673500167173583","0.779122469281485",NA,"1.06168945034742",NA,"0.300983931831533","1.03038315705732",NA,"0.548620025000485","0.809065891783359","0.135565724609775","34","9",NA,"no_exp","0.948536991262563"
 "aclew","winnipeg","sc_fem_ph","1.53308073537155","-0.512125909826183","0.499738025381938","-1.02478875693875","0.677347380422326","0.615158336230123","0.677347380422326",NA,"0.957835515801106",NA,"0.456262395382807","0.978690715088841",NA,"0.675471979717003","0.706970965893543","0.0918126296634204","33","9",NA,"no_exp","0.924845776921682"
 "aclew","winnipeg","sc_fem_ph","1.53308073537155","-0.512125909826183","0.499738025381938","-1.02478875693875","0.677347380422326","0.615158336230123","0.677347380422326",NA,"0.957835515801106",NA,"0.456262395382807","0.978690715088841",NA,"0.675471979717003","0.706970965893543","0.0918126296634204","33","9",NA,"no_exp","0.924845776921682"
 "aclew","winnipeg","sc_mal_ph","1.53263502528792","-0.323343917134552","0.382062053208532","-0.846312567341171","0.790021503871411","0.735146918743472","0.790021503871411",NA,"0.62397937232877",NA,"0.16584643528663","0.789923649683164",NA,"0.407242477262171","0.804606528208572","0.0694596094650995","34","9",NA,"no_exp","0.339541990209025"
 "aclew","winnipeg","sc_mal_ph","1.53263502528792","-0.323343917134552","0.382062053208532","-0.846312567341171","0.790021503871411","0.735146918743472","0.790021503871411",NA,"0.62397937232877",NA,"0.16584643528663","0.789923649683164",NA,"0.407242477262171","0.804606528208572","0.0694596094650995","34","9",NA,"no_exp","0.339541990209025"
@@ -273,8 +267,6 @@
 "aclew","winnipeg","cp_dur","0.763227682726025","0.288606817880222","0.326919915048109","0.88280586344136","0.594636011339268","0.555267870549428","0.594636011339268",NA,"0.393931815167624",NA,"0.268543728956237","0.62763987697375",NA,"0.518212050184321","0.621473313945251","0.0662054433958234","34","9",NA,"no_exp","0.576776256279571"
 "aclew","winnipeg","cp_dur","0.763227682726025","0.288606817880222","0.326919915048109","0.88280586344136","0.594636011339268","0.555267870549428","0.594636011339268",NA,"0.393931815167624",NA,"0.268543728956237","0.62763987697375",NA,"0.518212050184321","0.621473313945251","0.0662054433958234","34","9",NA,"no_exp","0.576776256279571"
 "aclew","winnipeg","avg_can_voc_dur_chi","1.54460472714213","0.666057843600313","0.476831161968232","1.39684210413389","0.748510060785466","0.626371025928425","0.748510060785466",NA,"0.90611199319773",NA,"0.304442200618824","0.951899150749558",NA,"0.551762811920869","0.789547235916667","0.163176209988242","31","9",NA,"no_exp","0.626928921584875"
 "aclew","winnipeg","avg_can_voc_dur_chi","1.54460472714213","0.666057843600313","0.476831161968232","1.39684210413389","0.748510060785466","0.626371025928425","0.748510060785466",NA,"0.90611199319773",NA,"0.304442200618824","0.951899150749558",NA,"0.551762811920869","0.789547235916667","0.163176209988242","31","9",NA,"no_exp","0.626928921584875"
 "aclew","winnipeg","can_voc_chi_ph","0.759730257963547","0.253118754814569","0.197492638512238","1.28166172026146","0.610542416719807","0.530123098965374","0.610542416719807",NA,"0.145405178579447",NA,"0.0927521952532334","0.381320309686551",NA,"0.304552450742452","0.661840921596753","0.131717822631378","34","9",NA,"no_exp","0.0544998543343993"
 "aclew","winnipeg","can_voc_chi_ph","0.759730257963547","0.253118754814569","0.197492638512238","1.28166172026146","0.610542416719807","0.530123098965374","0.610542416719807",NA,"0.145405178579447",NA,"0.0927521952532334","0.381320309686551",NA,"0.304552450742452","0.661840921596753","0.131717822631378","34","9",NA,"no_exp","0.0544998543343993"
-"aclew","winnipeg","voc_chi","1.29418227195075","-0.112301804368064","0.339868299180694","-0.330427417440183","0.707525841782578","0.699892627134684","0.707525841782577",NA,"0.461358744873535",NA,"0.190714603728353","0.679233939724404",NA,"0.436708831749889","0.710681229044492","0.0107886019098074","34","9",NA,"no_exp","0.070317170229625"
-"aclew","winnipeg","simple_CTC","0.849530774795723","-0.0149502300655827","0.262504049853543","-0.0569523787306284","0.777163326249469","0.77690188069958","0.777163326249468",NA,"0.291066355040012",NA,"0.0834576931348758","0.539505658024095",NA,"0.28889045178904","0.777238290745008","0.00033641004542836","34","9",NA,"no_exp","0.0382813139806771"
 "aclew","winnipeg","peak_voc_chi","1.160885258472","0.481431248977123","0.250351687817193","1.92301978538552","0.295294942420327","0.240383281448655","0.295294942420327",NA,"0.168951977161294",NA,"0.403194554629979","0.411037683383524",NA,"0.63497602681517","0.426338586072565","0.185955304623909","34","9",NA,"no_exp","0.241624033218101"
 "aclew","winnipeg","peak_voc_chi","1.160885258472","0.481431248977123","0.250351687817193","1.92301978538552","0.295294942420327","0.240383281448655","0.295294942420327",NA,"0.168951977161294",NA,"0.403194554629979","0.411037683383524",NA,"0.63497602681517","0.426338586072565","0.185955304623909","34","9",NA,"no_exp","0.241624033218101"
 "aclew","winnipeg","voc_fem_ph","1.27029419349646","-0.442032154310401","0.454145757120857","-0.973326618997273","0.735019359149984","0.670463713344719","0.735019359149984",NA,"0.841097976091663",NA,"0.303222871544723","0.917113938445853",NA,"0.550656763823639","0.758292210651132","0.0878284973064128","34","9",NA,"no_exp","0.974130284371251"
 "aclew","winnipeg","voc_fem_ph","1.27029419349646","-0.442032154310401","0.454145757120857","-0.973326618997273","0.735019359149984","0.670463713344719","0.735019359149984",NA,"0.841097976091663",NA,"0.303222871544723","0.917113938445853",NA,"0.550656763823639","0.758292210651132","0.0878284973064128","34","9",NA,"no_exp","0.974130284371251"
 "aclew","winnipeg","peak_voc_fem_ph","1.41080734677087","-0.0976546476861551","0.455453014181373","-0.214412122975361","0.453160540655547","0.451563410056433","0.453160540655547",NA,"0.679130868012787",NA,"0.819523156519775","0.824093967950735",NA,"0.90527518275924","0.455087835631536","0.00352442557510366","33","9",NA,"no_exp","0.601580294408424"
 "aclew","winnipeg","peak_voc_fem_ph","1.41080734677087","-0.0976546476861551","0.455453014181373","-0.214412122975361","0.453160540655547","0.451563410056433","0.453160540655547",NA,"0.679130868012787",NA,"0.819523156519775","0.824093967950735",NA,"0.90527518275924","0.455087835631536","0.00352442557510366","33","9",NA,"no_exp","0.601580294408424"
@@ -293,6 +285,7 @@
 "aclew","winnipeg","avg_voc_dur_och","0.880842216655181","0.571002352506899","0.215175232906928","2.65366206320725","0.325100504621302","0.223181178246601","0.325100504621302",NA,"0.130886091297792",NA,"0.271715840834725","0.361781828313408",NA,"0.521263696064405","0.536682156946783","0.313500978700182","34","9",NA,"no_exp","0.710386520660642"
 "aclew","winnipeg","avg_voc_dur_och","0.880842216655181","0.571002352506899","0.215175232906928","2.65366206320725","0.325100504621302","0.223181178246601","0.325100504621302",NA,"0.130886091297792",NA,"0.271715840834725","0.361781828313408",NA,"0.521263696064405","0.536682156946783","0.313500978700182","34","9",NA,"no_exp","0.710386520660642"
 "aclew","winnipeg","avg_voc_dur_chi","1.64011691421256","0.64063500473125","0.434671590079704","1.47383684453309","0.674745118869556","0.55677443774318","0.674745118869555",NA,"0.736996323130181",NA,"0.355262520275636","0.858484899768296",NA,"0.59603902579918","0.731611836084082","0.174837398340902","34","9",NA,"no_exp","0.0200207191958106"
 "aclew","winnipeg","avg_voc_dur_chi","1.64011691421256","0.64063500473125","0.434671590079704","1.47383684453309","0.674745118869556","0.55677443774318","0.674745118869555",NA,"0.736996323130181",NA,"0.355262520275636","0.858484899768296",NA,"0.59603902579918","0.731611836084082","0.174837398340902","34","9",NA,"no_exp","0.0200207191958106"
 "aclew","winnipeg","voc_dur_fem_ph","1.63196598608172","-0.518870136751592","0.516508997750117","-1.00457134147083","0.704011507804879","0.639682153618747","0.704011507804879",NA,"1.06279913267899",NA,"0.446834049302391","1.0309214968556",NA,"0.668456467769137","0.731057583527147","0.0913754299083995","34","9",NA,"no_exp","0.832311847796414"
 "aclew","winnipeg","voc_dur_fem_ph","1.63196598608172","-0.518870136751592","0.516508997750117","-1.00457134147083","0.704011507804879","0.639682153618747","0.704011507804879",NA,"1.06279913267899",NA,"0.446834049302391","1.0309214968556",NA,"0.668456467769137","0.731057583527147","0.0913754299083995","34","9",NA,"no_exp","0.832311847796414"
+"aclew","winnipeg","simple_CTC_ph","0.612927005537093","0.394114717282214","0.212615905317418","1.85364644612938","0.456734728180801","0.360107207295069","0.4567347281808",NA,"0.149086855599056",NA,"0.177332061992074","0.386117670664081",NA,"0.421108135746716","0.571668787625525","0.211561580330456","34","9",NA,"no_exp","0.00297846309959828"
 "aclew","quechua","wc_adu_ph","1.34912413250801","0.0509970403881791","0.101378944411157","0.503033846765591","0.570146740233352","0.564531883714405","0.570146740233351",NA,"0.435492608366334",NA,"0.328332873101988","0.659918637686749",NA,"0.57300337966018","0.574379973903693","0.00984809018928729","48","20",NA,"no_exp","0.952865266922495"
 "aclew","quechua","wc_adu_ph","1.34912413250801","0.0509970403881791","0.101378944411157","0.503033846765591","0.570146740233352","0.564531883714405","0.570146740233351",NA,"0.435492608366334",NA,"0.328332873101988","0.659918637686749",NA,"0.57300337966018","0.574379973903693","0.00984809018928729","48","20",NA,"no_exp","0.952865266922495"
 "aclew","quechua","sc_fem_ph","1.44059179488123","0.0651566815202495","0.09348576096296","0.696969044794589","0.366990256140832","0.360855881445253","0.366990256140832",NA,"0.270211116774136",NA,"0.466078504687756","0.5198183497859",NA,"0.682699424847975","0.377571242665156","0.0167153612199028","45","19",NA,"no_exp","0.537319320278391"
 "aclew","quechua","sc_fem_ph","1.44059179488123","0.0651566815202495","0.09348576096296","0.696969044794589","0.366990256140832","0.360855881445253","0.366990256140832",NA,"0.270211116774136",NA,"0.466078504687756","0.5198183497859",NA,"0.682699424847975","0.377571242665156","0.0167153612199028","45","19",NA,"no_exp","0.537319320278391"
 "aclew","quechua","sc_mal_ph","1.02044678186056","0.0586087436274094","0.0780868718991912","0.75055822063243","0.345779911454672","0.33958910656504","0.345779911454672",NA,"0.190320513446975",NA,"0.360088886122565","0.436257393572848",NA,"0.600074067197179","0.357492994803048","0.0179038882380082","48","20",NA,"no_exp","0.0826018432049434"
 "aclew","quechua","sc_mal_ph","1.02044678186056","0.0586087436274094","0.0780868718991912","0.75055822063243","0.345779911454672","0.33958910656504","0.345779911454672",NA,"0.190320513446975",NA,"0.360088886122565","0.436257393572848",NA,"0.600074067197179","0.357492994803048","0.0179038882380082","48","20",NA,"no_exp","0.0826018432049434"
@@ -315,8 +308,6 @@
 "aclew","quechua","cp_dur","0.995008283530584","0.0489635204052383","0.0911549106517026","0.537146271716781","0.545317454854439","0.539319902262144","0.545317454854439",NA,"0.343416720975225",NA,"0.286338879030083","0.586017679746289",NA,"0.535106418416078","0.550318179575486","0.0109982773133421","48","20",NA,"no_exp","0.689796988356853"
 "aclew","quechua","cp_dur","0.995008283530584","0.0489635204052383","0.0911549106517026","0.537146271716781","0.545317454854439","0.539319902262144","0.545317454854439",NA,"0.343416720975225",NA,"0.286338879030083","0.586017679746289",NA,"0.535106418416078","0.550318179575486","0.0109982773133421","48","20",NA,"no_exp","0.689796988356853"
 "aclew","quechua","avg_can_voc_dur_chi","0.880233565105352","-0.182255411046095","0.0874046485483319","-2.08519128070533","0.831677123460697","0.688745046808733","0.831677123460697",NA,"0.391402284707761",NA,"0.0792157876988654","0.625621518737776",NA,"0.281452993764261","0.86060510237598","0.171860055567248","47","20",NA,"no_exp","0.941265192836557"
 "aclew","quechua","avg_can_voc_dur_chi","0.880233565105352","-0.182255411046095","0.0874046485483319","-2.08519128070533","0.831677123460697","0.688745046808733","0.831677123460697",NA,"0.391402284707761",NA,"0.0792157876988654","0.625621518737776",NA,"0.281452993764261","0.86060510237598","0.171860055567248","47","20",NA,"no_exp","0.941265192836557"
 "aclew","quechua","can_voc_chi_ph","1.26101872342133","0.110643154320495","0.094881737360382","1.16611644557317","0.578341698806978","0.54882006410218","0.578341698806978",NA,"0.384483375883662",NA,"0.280319761563952","0.620067234970259",NA,"0.529452322276475","0.59986537998671","0.0510453158845296","48","20",NA,"no_exp","0.279905215094906"
 "aclew","quechua","can_voc_chi_ph","1.26101872342133","0.110643154320495","0.094881737360382","1.16611644557317","0.578341698806978","0.54882006410218","0.578341698806978",NA,"0.384483375883662",NA,"0.280319761563952","0.620067234970259",NA,"0.529452322276475","0.59986537998671","0.0510453158845296","48","20",NA,"no_exp","0.279905215094906"
-"aclew","quechua","voc_chi","1.18836412014673","0.0800746299848807","0.0903613892811495","0.886159792604973","0.0231529483274631","0.0227422941773223","0.0231529483274631",NA,"0.0245158992246179",NA,"1.03435137235902","0.156575538397982",NA,"1.01703066441431","0.0404788754685136","0.0177365812911913","46","20",NA,"no_exp","0.568257256127107"
-"aclew","quechua","simple_CTC","1.14593842076699",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "aclew","quechua","peak_voc_chi","1.0291090939968","0.191970946982444","0.102321777878127","1.87614944700331","0.0793149753598696","0.0728509441950392","0.0793149753598696",NA,"0.0950709586214473",NA,"1.10357984080312","0.308335788745723",NA,"1.05051408405748","0.154349187565874","0.0814982433708343","45","20",NA,"no_exp","0.00296733418418721"
 "aclew","quechua","peak_voc_chi","1.0291090939968","0.191970946982444","0.102321777878127","1.87614944700331","0.0793149753598696","0.0728509441950392","0.0793149753598696",NA,"0.0950709586214473",NA,"1.10357984080312","0.308335788745723",NA,"1.05051408405748","0.154349187565874","0.0814982433708343","45","20",NA,"no_exp","0.00296733418418721"
 "aclew","quechua","voc_fem_ph","1.26197499446658","0.152730383120781","0.0972978891637173","1.56971938891491","0.43735472864307","0.400825814435836","0.43735472864307",NA,"0.32985773779234",NA,"0.424353240595276","0.574332427947735",NA,"0.651424009839426","0.484348208993151","0.0835223945573151","46","19",NA,"no_exp","0.544888548045699"
 "aclew","quechua","voc_fem_ph","1.26197499446658","0.152730383120781","0.0972978891637173","1.56971938891491","0.43735472864307","0.400825814435836","0.43735472864307",NA,"0.32985773779234",NA,"0.424353240595276","0.574332427947735",NA,"0.651424009839426","0.484348208993151","0.0835223945573151","46","19",NA,"no_exp","0.544888548045699"
 "aclew","quechua","peak_voc_fem_ph","1.21533403968816","0.0418341170780366","0.0993725710685195","0.420982537014073","0.0609742251576579","0.0606984722245063","0.0609742251576579",NA,"0.0614905068210628",NA,"0.94697670472726","0.247972794517993",NA,"0.973127280846272","0.0652209230213568","0.00452245079685048","43","20",NA,"no_exp","0.00777358117503271"
 "aclew","quechua","peak_voc_fem_ph","1.21533403968816","0.0418341170780366","0.0993725710685195","0.420982537014073","0.0609742251576579","0.0606984722245063","0.0609742251576579",NA,"0.0614905068210628",NA,"0.94697670472726","0.247972794517993",NA,"0.973127280846272","0.0652209230213568","0.00452245079685048","43","20",NA,"no_exp","0.00777358117503271"
@@ -335,9 +326,9 @@
 "aclew","quechua","avg_voc_dur_och","1.1325901381817","0.0974154685473635","0.0844619372576754","1.1533653111717","0.391997845739364","0.375130030631393","0.391997845739364",NA,"0.241666756591046",NA,"0.374833459463019","0.491596131586738",NA,"0.61223644081598","0.418160407689093","0.0430303770576999","48","20",NA,"no_exp","0.755707743369048"
 "aclew","quechua","avg_voc_dur_och","1.1325901381817","0.0974154685473635","0.0844619372576754","1.1533653111717","0.391997845739364","0.375130030631393","0.391997845739364",NA,"0.241666756591046",NA,"0.374833459463019","0.491596131586738",NA,"0.61223644081598","0.418160407689093","0.0430303770576999","48","20",NA,"no_exp","0.755707743369048"
 "aclew","quechua","avg_voc_dur_chi","0.742238915116269","-0.163723403842593","0.0820894504393387","-1.99445121104299","0.564507891733964","0.488471097439995","0.564507891733965",NA,"0.283962509890646",NA,"0.219064133401117","0.532881328149755",NA,"0.468042875601282","0.623166812783161","0.134695715343166","48","20",NA,"no_exp","0.0461625132554059"
 "aclew","quechua","avg_voc_dur_chi","0.742238915116269","-0.163723403842593","0.0820894504393387","-1.99445121104299","0.564507891733964","0.488471097439995","0.564507891733965",NA,"0.283962509890646",NA,"0.219064133401117","0.532881328149755",NA,"0.468042875601282","0.623166812783161","0.134695715343166","48","20",NA,"no_exp","0.0461625132554059"
 "aclew","quechua","voc_dur_fem_ph","1.50286144026239","0.0264564704403699","0.104102182723123","0.254139440195364","0.495134031520854","0.49395372249446","0.495134031520854",NA,"0.423673700026926",NA,"0.432001072974578","0.650902220019971",NA,"0.657267885245109","0.496337539706071","0.00238381721161077","48","20",NA,"no_exp","0.530591699654749"
 "aclew","quechua","voc_dur_fem_ph","1.50286144026239","0.0264564704403699","0.104102182723123","0.254139440195364","0.495134031520854","0.49395372249446","0.495134031520854",NA,"0.423673700026926",NA,"0.432001072974578","0.650902220019971",NA,"0.657267885245109","0.496337539706071","0.00238381721161077","48","20",NA,"no_exp","0.530591699654749"
+"aclew","quechua","simple_CTC_ph","1.14670330974059","0.159796932756354","0.0949710085126013","1.68258645726765","0.366914339299268","0.335545755408457","0.366914339299268",NA,"0.292760704661307",NA,"0.505138623068484","0.541073659182654",NA,"0.710731048335785","0.421038690764209","0.085492935355752","48","20",NA,"no_exp","0.883446711501448"
 "lena","bergelson","voc_fem_ph","1.44432106725794","-0.384256845100495","0.106493471760121","-3.60826667352945","0.501806353357788","0.495517868883456","0.501806353357792",NA,"0.54155149368433",NA,"0.537652645642701","0.735901823400602",NA,"0.733248011004941","0.50804956449124","0.0125316956077845","514","44",NA,"no_exp","4.44003895315091e-05"
 "lena","bergelson","voc_fem_ph","1.44432106725794","-0.384256845100495","0.106493471760121","-3.60826667352945","0.501806353357788","0.495517868883456","0.501806353357792",NA,"0.54155149368433",NA,"0.537652645642701","0.735901823400602",NA,"0.733248011004941","0.50804956449124","0.0125316956077845","514","44",NA,"no_exp","4.44003895315091e-05"
 "lena","bergelson","peak_lena_CVC","0.811430246141258","0.385781810301356","0.0747286966317156","5.16243193966836","0.295748524518628","0.285435314905824","0.295748524518628",NA,"0.113623944439574",NA,"0.270567133519354","0.337081510082612",NA,"0.520160680481863","0.320306865421891","0.0348715505160667","521","44",NA,"no_exp","6.48228750104638e-13"
 "lena","bergelson","peak_lena_CVC","0.811430246141258","0.385781810301356","0.0747286966317156","5.16243193966836","0.295748524518628","0.285435314905824","0.295748524518628",NA,"0.113623944439574",NA,"0.270567133519354","0.337081510082612",NA,"0.520160680481863","0.320306865421891","0.0348715505160667","521","44",NA,"no_exp","6.48228750104638e-13"
-"lena","bergelson","lena_CVC","0.832709315558171","0.377499684097209","0.0690720786985389","5.46530075842635","0.391066389156776","0.377835757571466","0.391066389156777",NA,"0.148441754338498",NA,"0.231140225740563","0.385281396304698",NA,"0.480770450153255","0.411667945537909","0.0338321879664435","521","44",NA,"no_exp","8.61819958224128e-08"
 "lena","bergelson","lp_dur","1.0867176776109","0.483409480624364","0.0918867774856235","5.26092538940107","0.319864336904603","0.30868217922118","0.319864336904601",NA,"0.192776914017797",NA,"0.409906448195514","0.439063678773133",NA,"0.640239367889475","0.343641242778047","0.0349590635568669","521","44",NA,"no_exp","0.714403024480289"
 "lena","bergelson","lp_dur","1.0867176776109","0.483409480624364","0.0918867774856235","5.26092538940107","0.319864336904603","0.30868217922118","0.319864336904601",NA,"0.192776914017797",NA,"0.409906448195514","0.439063678773133",NA,"0.640239367889475","0.343641242778047","0.0349590635568669","521","44",NA,"no_exp","0.714403024480289"
 "lena","bergelson","lp_n","1.11088910655532","0.512185439004922","0.0906590699127935","5.64957747192423","0.384410639106742","0.370324293944226","0.384410639106747",NA,"0.248156768362271",NA,"0.397394481048808","0.498153358276616",NA,"0.630392323120141","0.406968298374616","0.0366440044303897","518","44",NA,"no_exp","0.760242581712819"
 "lena","bergelson","lp_n","1.11088910655532","0.512185439004922","0.0906590699127935","5.64957747192423","0.384410639106742","0.370324293944226","0.384410639106747",NA,"0.248156768362271",NA,"0.397394481048808","0.498153358276616",NA,"0.630392323120141","0.406968298374616","0.0366440044303897","518","44",NA,"no_exp","0.760242581712819"
 "lena","bergelson","peak_wc_adu_ph","1.32446577089541","-0.311092680953496","0.1349878224631","-2.30459811320043","0.218973648820759","0.217180522333377","0.218973648820757",NA,"0.234355834003261",NA,"0.835890906941789","0.48410312331492",NA,"0.914270696753313","0.225369299828013","0.00818877749463555","505","44",NA,"no_exp","1.11184715771888e-10"
 "lena","bergelson","peak_wc_adu_ph","1.32446577089541","-0.311092680953496","0.1349878224631","-2.30459811320043","0.218973648820759","0.217180522333377","0.218973648820757",NA,"0.234355834003261",NA,"0.835890906941789","0.48410312331492",NA,"0.914270696753313","0.225369299828013","0.00818877749463555","505","44",NA,"no_exp","1.11184715771888e-10"
@@ -359,12 +350,12 @@
 "lena","bergelson","peak_voc_mal_ph","1.52680327255262","-0.187870823975776","0.118503159058766","-1.5853655334421","0.404850569151546","0.403646132936778","0.404850569151548",NA,"0.44592663063634",NA,"0.655533178524549","0.667777381045765",NA,"0.809650034598004","0.406621147192758","0.00297501425597979","504","44",NA,"no_exp","3.11171755210047e-10"
 "lena","bergelson","peak_voc_mal_ph","1.52680327255262","-0.187870823975776","0.118503159058766","-1.5853655334421","0.404850569151546","0.403646132936778","0.404850569151548",NA,"0.44592663063634",NA,"0.655533178524549","0.667777381045765",NA,"0.809650034598004","0.406621147192758","0.00297501425597979","504","44",NA,"no_exp","3.11171755210047e-10"
 "lena","bergelson","voc_mal_ph","1.41687385380349","-0.0992750171616973","0.114531176731873","-0.866794701621797","0.522628384750069","0.522249949394083","0.522628384750067",NA,"0.656607859398261",NA,"0.59974919765723","0.810313432813662",NA,"0.774434760103929","0.522974049666913","0.000724100272830268","498","44",NA,"no_exp","3.16054605569192e-11"
 "lena","bergelson","voc_mal_ph","1.41687385380349","-0.0992750171616973","0.114531176731873","-0.866794701621797","0.522628384750069","0.522249949394083","0.522628384750067",NA,"0.656607859398261",NA,"0.59974919765723","0.810313432813662",NA,"0.774434760103929","0.522974049666913","0.000724100272830268","498","44",NA,"no_exp","3.16054605569192e-11"
 "lena","bergelson","peak_voc_fem_ph","1.52193789724252","-0.521064203857825","0.123467327724888","-4.22025983277836","0.269108027179909","0.262462193012533","0.269108027179911",NA,"0.267862985856613",NA,"0.727510465703548","0.517554814349758",NA,"0.852942240543607","0.28715797870507","0.0246957856925369","516","44",NA,"no_exp","2.51961602746532e-09"
 "lena","bergelson","peak_voc_fem_ph","1.52193789724252","-0.521064203857825","0.123467327724888","-4.22025983277836","0.269108027179909","0.262462193012533","0.269108027179911",NA,"0.267862985856613",NA,"0.727510465703548","0.517554814349758",NA,"0.852942240543607","0.28715797870507","0.0246957856925369","516","44",NA,"no_exp","2.51961602746532e-09"
-"lena","bergelson","lena_CTC","0.946019786462397","0.524816436875325","0.0813515217536462","6.45121843528148","0.47785158820979","0.458553421278345","0.477851588209786",NA,"0.290343662259939",NA,"0.317258508421706","0.538835468635778",NA,"0.563257053592502","0.49893869446273","0.0403852731843843","519","44",NA,"no_exp","4.39937691372718e-08"
 "lena","bergelson","peak_lena_CTC","0.910837727647427","0.685708758803274","0.0787240151171252","8.7102869154105","0.401823368610815","0.369464039893802","0.401823368610816",NA,"0.200900012429771",NA,"0.29907094029088","0.448218710486043",NA,"0.546873788264605","0.449995266409785","0.0805312265159825","520","44",NA,"no_exp","0.000138029472808597"
 "lena","bergelson","peak_lena_CTC","0.910837727647427","0.685708758803274","0.0787240151171252","8.7102869154105","0.401823368610815","0.369464039893802","0.401823368610816",NA,"0.200900012429771",NA,"0.29907094029088","0.448218710486043",NA,"0.546873788264605","0.449995266409785","0.0805312265159825","520","44",NA,"no_exp","0.000138029472808597"
 "lena","bergelson","standardScore","1.38582885683012","-0.275518772001842","0.13448316262595","-2.04872317561542","0.19552959951536","0.194209467707599","0.195529599515361",NA,"0.209283256315034",NA,"0.861057279510554","0.45747486959945",NA,"0.927931721362382","0.200961037858783","0.00675157015118437","499","44",NA,"no_exp","0.102317064789299"
 "lena","bergelson","standardScore","1.38582885683012","-0.275518772001842","0.13448316262595","-2.04872317561542","0.19552959951536","0.194209467707599","0.195529599515361",NA,"0.209283256315034",NA,"0.861057279510554","0.45747486959945",NA,"0.927931721362382","0.200961037858783","0.00675157015118437","499","44",NA,"no_exp","0.102317064789299"
+"lena","bergelson","lena_CTC_ph","0.974403518025896","0.62438665474341","0.0827073564732151","7.54934846630745","0.4838574688201","0.457712293117331","0.483857468820098",NA,"0.306816919786359",NA,"0.327289071249682","0.553910570206381",NA,"0.572091838125385","0.511747163688875","0.054034870571544","518","44",NA,"no_exp","5.74517207564719e-08"
+"lena","bergelson","lena_CVC_ph","0.843721799550641","0.465201511750189","0.0673545201827081","6.90676008808715","0.428118871787382","0.406755207901022","0.428118871787384",NA,"0.164533340269288",NA,"0.219783612595617","0.405627095087703",NA,"0.468810849485821","0.456656450976729","0.0499012430757072","521","44",NA,"no_exp","3.47516134770613e-07"
 "lena","cougar","voc_fem_ph","1.33368802065132","0.0163148565766947","0.119004149483566","0.137094854654188","0.447163572453812","0.447003437247275","0.447163572453814",NA,"0.542124499014295",NA,"0.670238341812348","0.736291042329251",NA,"0.818680854675586","0.447361550511418","0.000358113264143633","230","26",NA,"no_exp","0.0611981596080845"
 "lena","cougar","voc_fem_ph","1.33368802065132","0.0163148565766947","0.119004149483566","0.137094854654188","0.447163572453812","0.447003437247275","0.447163572453814",NA,"0.542124499014295",NA,"0.670238341812348","0.736291042329251",NA,"0.818680854675586","0.447361550511418","0.000358113264143633","230","26",NA,"no_exp","0.0611981596080845"
 "lena","cougar","peak_lena_CVC","1.79631840721851","0.511665052115714","0.0972996234309456","5.2586539811107","0.445450770415078","0.289654972411181","0.445450770415078",NA,"0.354625029215531",NA,"0.441478721789514","0.595504012761905",NA,"0.664438651637241","0.63940360537173","0.349748632960549","223","26",NA,"no_exp","0.00252703302084437"
 "lena","cougar","peak_lena_CVC","1.79631840721851","0.511665052115714","0.0972996234309456","5.2586539811107","0.445450770415078","0.289654972411181","0.445450770415078",NA,"0.354625029215531",NA,"0.441478721789514","0.595504012761905",NA,"0.664438651637241","0.63940360537173","0.349748632960549","223","26",NA,"no_exp","0.00252703302084437"
-"lena","cougar","lena_CVC","2.17826960369834","0.516476219633951","0.0952198455031229","5.42403967266479","0.489204861911773","0.310355936948518","0.489204861911774",NA,"0.363869814105093",NA,"0.379928627887325","0.603216225001527",NA,"0.616383507150641","0.675946998869545","0.365591061921027","224","26",NA,"no_exp","0.0361444674341613"
 "lena","cougar","lp_dur","1.76410765463735","0.636980060327661","0.0713226239052066","8.93096783952113","0.476562417331958","0.189639486252431","0.476562417331958",NA,"0.208216735503788",NA,"0.228697145933805","0.456307720188677",NA,"0.478222904024687","0.791707380497784","0.602067894245353","239","26",NA,"no_exp","1.41615955327324e-06"
 "lena","cougar","lp_dur","1.76410765463735","0.636980060327661","0.0713226239052066","8.93096783952113","0.476562417331958","0.189639486252431","0.476562417331958",NA,"0.208216735503788",NA,"0.228697145933805","0.456307720188677",NA,"0.478222904024687","0.791707380497784","0.602067894245353","239","26",NA,"no_exp","1.41615955327324e-06"
 "lena","cougar","lp_n","1.59817322420889","0.546702718028517","0.0707326965785996","7.72913722327849","0.409846284476985","0.195834357602359","0.409846284476984",NA,"0.18262281608173",NA,"0.262965744797331","0.427343908441117",NA,"0.512801857248325","0.718010439173361","0.522176081571002","239","26",NA,"no_exp","6.84542356897702e-09"
 "lena","cougar","lp_n","1.59817322420889","0.546702718028517","0.0707326965785996","7.72913722327849","0.409846284476985","0.195834357602359","0.409846284476984",NA,"0.18262281608173",NA,"0.262965744797331","0.427343908441117",NA,"0.512801857248325","0.718010439173361","0.522176081571002","239","26",NA,"no_exp","6.84542356897702e-09"
 "lena","cougar","peak_wc_adu_ph","1.61422065193601","-0.0337661114590718","0.105928043621393","-0.318764609490555","0.249112454131352","0.248726368860806","0.249112454131351",NA,"0.29753287096958",NA,"0.896838851660949","0.545465737667895",NA,"0.947015761041467","0.250276212171097","0.00154984331029136","230","26",NA,"no_exp","0.0738081385937209"
 "lena","cougar","peak_wc_adu_ph","1.61422065193601","-0.0337661114590718","0.105928043621393","-0.318764609490555","0.249112454131352","0.248726368860806","0.249112454131351",NA,"0.29753287096958",NA,"0.896838851660949","0.545465737667895",NA,"0.947015761041467","0.250276212171097","0.00154984331029136","230","26",NA,"no_exp","0.0738081385937209"
@@ -386,12 +377,12 @@
 "lena","cougar","peak_voc_mal_ph","1.38658664548146","0.0353153494855863","0.118931410439839","0.296938793166423","0.429645156551239","0.42892875823996","0.42964515655124",NA,"0.531333592172233",NA,"0.705346454304366","0.728926328357148",NA,"0.839849066382982","0.430596176807017","0.00166741856705712","234","26",NA,"no_exp","1.29895017312522e-07"
 "lena","cougar","peak_voc_mal_ph","1.38658664548146","0.0353153494855863","0.118931410439839","0.296938793166423","0.429645156551239","0.42892875823996","0.42964515655124",NA,"0.531333592172233",NA,"0.705346454304366","0.728926328357148",NA,"0.839849066382982","0.430596176807017","0.00166741856705712","234","26",NA,"no_exp","1.29895017312522e-07"
 "lena","cougar","voc_mal_ph","1.49198492341931","0.0706545986934798","0.12510974355888","0.564740976071363","0.515369998460367","0.512144727703177","0.515369998460369",NA,"0.675799517730076",NA,"0.635490467618275","0.822070263256174",NA,"0.797176559877594","0.518402893228577","0.00625816552540028","227","26",NA,"no_exp","1.76342738745896e-06"
 "lena","cougar","voc_mal_ph","1.49198492341931","0.0706545986934798","0.12510974355888","0.564740976071363","0.515369998460367","0.512144727703177","0.515369998460369",NA,"0.675799517730076",NA,"0.635490467618275","0.822070263256174",NA,"0.797176559877594","0.518402893228577","0.00625816552540028","227","26",NA,"no_exp","1.76342738745896e-06"
 "lena","cougar","peak_voc_fem_ph","1.66799082522217","-0.0412167949874865","0.107094723270324","-0.384862986045064","0.243575439006891","0.243021614257192","0.243575439006892",NA,"0.300959395070815",NA,"0.934630680422386","0.548597662290694",NA,"0.966762990821631","0.245295344120749","0.00227372986355713","232","26",NA,"no_exp","0.00900619927453804"
 "lena","cougar","peak_voc_fem_ph","1.66799082522217","-0.0412167949874865","0.107094723270324","-0.384862986045064","0.243575439006891","0.243021614257192","0.243575439006892",NA,"0.300959395070815",NA,"0.934630680422386","0.548597662290694",NA,"0.966762990821631","0.245295344120749","0.00227372986355713","232","26",NA,"no_exp","0.00900619927453804"
-"lena","cougar","lena_CTC","2.10599918818077","0.336616374785288","0.104055058821538","3.23498327325545","0.619427585335743","0.516297251817864","0.619427585335741",NA,"0.5735161936371",NA,"0.352364744206897","0.757308519453664",NA,"0.593603187497252","0.682790213964489","0.166492962146625","226","26",NA,"no_exp","0.00735949251965056"
 "lena","cougar","peak_lena_CTC","1.73887202550873","0.292534429705845","0.106788670305046","2.73937702258308","0.428222061650278","0.373968342117643","0.428222061650278",NA,"0.417025938276605",NA,"0.556828460232137","0.645775454997018",NA,"0.746209394360683","0.500663635030748","0.126695292913105","225","26",NA,"no_exp","0.0515961463932071"
 "lena","cougar","peak_lena_CTC","1.73887202550873","0.292534429705845","0.106788670305046","2.73937702258308","0.428222061650278","0.373968342117643","0.428222061650278",NA,"0.417025938276605",NA,"0.556828460232137","0.645775454997018",NA,"0.746209394360683","0.500663635030748","0.126695292913105","225","26",NA,"no_exp","0.0515961463932071"
 "lena","cougar","standardScore","1.16269024434181","0.239301761177863","0.0980451356333721","2.44073058425564","0.341261242062345","0.316760200021127","0.341261242062345",NA,"0.232104927117411",NA,"0.448033625138716","0.481772692374123",NA,"0.669353139335819","0.388555760200042","0.0717955601789142","189","25",NA,"no_exp","0.0811051002247038"
 "lena","cougar","standardScore","1.16269024434181","0.239301761177863","0.0980451356333721","2.44073058425564","0.341261242062345","0.316760200021127","0.341261242062345",NA,"0.232104927117411",NA,"0.448033625138716","0.481772692374123",NA,"0.669353139335819","0.388555760200042","0.0717955601789142","189","25",NA,"no_exp","0.0811051002247038"
+"lena","cougar","lena_CTC_ph","2.01787624874969","0.376500528181822","0.111283611357678","3.38325224701513","0.588657996213219","0.480077935005607","0.588657996213221",NA,"0.606314586529939",NA,"0.42368006304639","0.77866204898527",NA,"0.650907107847494","0.664531491919973","0.184453556914367","216","26",NA,"no_exp","0.0174142428218277"
+"lena","cougar","lena_CVC_ph","2.31961270470211","0.591228248076329","0.0989813916816026","5.97312523123696","0.552689156085518","0.323133863947534","0.552689156085516",NA,"0.440796024764844",NA,"0.356751782915753","0.663924713175254",NA,"0.597287018874304","0.738476357301004","0.415342493353471","216","26",NA,"no_exp","0.000138396999439429"
 "lena","fausey-trio","voc_fem_ph","1.14170314826048","-0.675927071909037","0.772373979814099","-0.875129263251106","0.433335474208679","0.426262235190336","0.433335474208679",NA,"0.270900292941391",NA,"0.354251140681916","0.520480828601199",NA,"0.595190003849121","0.442585013821048","0.0163227786307124","83","28",NA,"no_exp","0.952052137611442"
 "lena","fausey-trio","voc_fem_ph","1.14170314826048","-0.675927071909037","0.772373979814099","-0.875129263251106","0.433335474208679","0.426262235190336","0.433335474208679",NA,"0.270900292941391",NA,"0.354251140681916","0.520480828601199",NA,"0.595190003849121","0.442585013821048","0.0163227786307124","83","28",NA,"no_exp","0.952052137611442"
 "lena","fausey-trio","peak_lena_CVC","0.479214239568931","-0.481592857924175","0.460057795792913","-1.04680947117556","0.306762537189052","0.300492860556707","0.306762537189051",NA,"0.077424505099147",NA,"0.17496780397682","0.278252592259528",NA,"0.418291529888928","0.320931068852269","0.0204382082955626","83","28",NA,"no_exp","9.3863004548359e-05"
 "lena","fausey-trio","peak_lena_CVC","0.479214239568931","-0.481592857924175","0.460057795792913","-1.04680947117556","0.306762537189052","0.300492860556707","0.306762537189051",NA,"0.077424505099147",NA,"0.17496780397682","0.278252592259528",NA,"0.418291529888928","0.320931068852269","0.0204382082955626","83","28",NA,"no_exp","9.3863004548359e-05"
-"lena","fausey-trio","lena_CVC","0.525586526819951","-0.392422095119883","0.424005646961764","-0.925511482999824","0.473270465927506","0.46433933283596","0.473270465927507",NA,"0.0860344219585648",NA,"0.0957525860051714","0.293316249053074",NA,"0.309439147499426","0.483210430304599","0.0188710974686392","83","28",NA,"no_exp","0.738423205115058"
 "lena","fausey-trio","lp_dur","1.20597713164882","-0.262242555588614","0.868846075918868","-0.30182855497307","0.718524312204647","0.716789287255132","0.718524312204648",NA,"0.467287816551621",NA,"0.183055962516679","0.683584535044219",NA,"0.427850397354822","0.719203993229647","0.00241470597451477","82","28",NA,"no_exp","0.968155154631053"
 "lena","fausey-trio","lp_dur","1.20597713164882","-0.262242555588614","0.868846075918868","-0.30182855497307","0.718524312204647","0.716789287255132","0.718524312204648",NA,"0.467287816551621",NA,"0.183055962516679","0.683584535044219",NA,"0.427850397354822","0.719203993229647","0.00241470597451477","82","28",NA,"no_exp","0.968155154631053"
 "lena","fausey-trio","lp_n","0.918402891128819","-0.546693567144419","0.837733000235204","-0.652586882683298","0.77667770036091","0.768048531948255","0.776677700360911",NA,"0.461307947264588",NA,"0.132642345180046","0.679196545386229",NA,"0.364200968120687","0.779158891378743","0.011110359430488","81","28",NA,"no_exp","0.611758475375984"
 "lena","fausey-trio","lp_n","0.918402891128819","-0.546693567144419","0.837733000235204","-0.652586882683298","0.77667770036091","0.768048531948255","0.776677700360911",NA,"0.461307947264588",NA,"0.132642345180046","0.679196545386229",NA,"0.364200968120687","0.779158891378743","0.011110359430488","81","28",NA,"no_exp","0.611758475375984"
 "lena","fausey-trio","peak_wc_adu_ph","1.43374181126905","-2.0512427139547","0.835003934467866","-2.45656652535646","0.292404711208007","0.262706481744127","0.292404711208008",NA,"0.247107384474461",NA,"0.597979493413347","0.497098968490643",NA,"0.773291337991928","0.364271977529705","0.101565495785578","83","28",NA,"no_exp","0.143984616162757"
 "lena","fausey-trio","peak_wc_adu_ph","1.43374181126905","-2.0512427139547","0.835003934467866","-2.45656652535646","0.292404711208007","0.262706481744127","0.292404711208008",NA,"0.247107384474461",NA,"0.597979493413347","0.497098968490643",NA,"0.773291337991928","0.364271977529705","0.101565495785578","83","28",NA,"no_exp","0.143984616162757"
@@ -413,12 +404,12 @@
 "lena","fausey-trio","peak_voc_mal_ph","1.26417530438759","-1.24153637098849","0.874206007999451","-1.42018741535493","0.297063403171847","0.286129660426738","0.297063403171846",NA,"0.265787922644534",NA,"0.628929904615999","0.515546237154859",NA,"0.79305101009708","0.322935751747196","0.0368060913204583","82","28",NA,"no_exp","0.0133114050315973"
 "lena","fausey-trio","peak_voc_mal_ph","1.26417530438759","-1.24153637098849","0.874206007999451","-1.42018741535493","0.297063403171847","0.286129660426738","0.297063403171846",NA,"0.265787922644534",NA,"0.628929904615999","0.515546237154859",NA,"0.79305101009708","0.322935751747196","0.0368060913204583","82","28",NA,"no_exp","0.0133114050315973"
 "lena","fausey-trio","voc_mal_ph","1.1523742803507","-0.865850404355435","0.735118964953255","-1.17783711975176","0.307401870419377","0.299485370881357","0.307401870419377",NA,"0.197952814878024",NA,"0.44600167573052","0.44491888572865",NA,"0.667833568885632","0.325238303117","0.025752932235643","83","28",NA,"no_exp","0.0079067114893917"
 "lena","fausey-trio","voc_mal_ph","1.1523742803507","-0.865850404355435","0.735118964953255","-1.17783711975176","0.307401870419377","0.299485370881357","0.307401870419377",NA,"0.197952814878024",NA,"0.44600167573052","0.44491888572865",NA,"0.667833568885632","0.325238303117","0.025752932235643","83","28",NA,"no_exp","0.0079067114893917"
 "lena","fausey-trio","peak_voc_fem_ph","1.33439266017774","-1.63297362521654","0.868097420903449","-1.88109489314813","0.346579566946559","0.323796958999833","0.346579566946559",NA,"0.29823434099901",NA,"0.562273229099595","0.546108360125543",NA,"0.749848804159608","0.389532536395366","0.0657355773955335","83","28",NA,"no_exp","0.0100843403021042"
 "lena","fausey-trio","peak_voc_fem_ph","1.33439266017774","-1.63297362521654","0.868097420903449","-1.88109489314813","0.346579566946559","0.323796958999833","0.346579566946559",NA,"0.29823434099901",NA,"0.562273229099595","0.546108360125543",NA,"0.749848804159608","0.389532536395366","0.0657355773955335","83","28",NA,"no_exp","0.0100843403021042"
-"lena","fausey-trio","lena_CTC","0.882362380270535","-0.876281838445445","0.519087839807706","-1.68811860198856","0.538492038731694","0.504449697311984","0.538492038731694",NA,"0.139120899413065",NA,"0.119231851243631","0.372989141146314",NA,"0.345299654276732","0.567667607645236","0.0632179103332514","83","28",NA,"no_exp","0.780852079694043"
 "lena","fausey-trio","peak_lena_CTC","0.776282154244965","-1.15277770350437","0.580027886570938","-1.98745220737483","0.450636288150903","0.414590401171457","0.450636288150903",NA,"0.156389592756517",NA,"0.19065212773659","0.395461240523666",NA,"0.436637295402707","0.494579270082465","0.0799888689110084","83","28",NA,"no_exp","0.00534104073488388"
 "lena","fausey-trio","peak_lena_CTC","0.776282154244965","-1.15277770350437","0.580027886570938","-1.98745220737483","0.450636288150903","0.414590401171457","0.450636288150903",NA,"0.156389592756517",NA,"0.19065212773659","0.395461240523666",NA,"0.436637295402707","0.494579270082465","0.0799888689110084","83","28",NA,"no_exp","0.00534104073488388"
 "lena","fausey-trio","standardScore","1.29712657607032","-2.95340589603349","1.0426598657928","-2.83256888744617","0.643058770351591","0.532647249323966","0.643058770351591",NA,"0.61514418792444",NA,"0.341446743240547","0.784311282543124",NA,"0.58433444468091","0.704344652606807","0.171697403282841","80","28",NA,"no_exp","0.665473801414775"
 "lena","fausey-trio","standardScore","1.29712657607032","-2.95340589603349","1.0426598657928","-2.83256888744617","0.643058770351591","0.532647249323966","0.643058770351591",NA,"0.61514418792444",NA,"0.341446743240547","0.784311282543124",NA,"0.58433444468091","0.704344652606807","0.171697403282841","80","28",NA,"no_exp","0.665473801414775"
+"lena","fausey-trio","lena_CTC_ph","0.707992002614336","-0.446384207909664","0.546031620825372","-0.817506149616238","0.515892399872691","0.507993673745356","0.515892399872691",NA,"0.150108417758107",NA,"0.140860043485264","0.387438276062274",NA,"0.375313260470855","0.523304475240561","0.0153108014952048","83","28",NA,"no_exp","0.210640275958099"
+"lena","fausey-trio","lena_CVC_ph","0.490227017382692","0.00824827552141689","0.430016555415455","0.0191812975978284","0.403992086811706","0.403988954481443","0.403992086811706",NA,"0.0804874462009536",NA,"0.118742808124467","0.283703095155752",NA,"0.34459078357447","0.40399670792604","7.75344459686704e-06","83","28",NA,"no_exp","0.0466846369239647"
 "lena","lucid","voc_fem_ph","1.38303268167561","-0.327282489031239","0.0874105301565211","-3.74419979429472","0.415826614966402","0.401394160385454","0.415826614966404",NA,"0.364760344775465",NA,"0.512433013338314","0.603953926036966",NA,"0.715844266121001","0.436102026744885","0.0347078663594309","232","35",NA,"no_exp","0.00558738479778867"
 "lena","lucid","voc_fem_ph","1.38303268167561","-0.327282489031239","0.0874105301565211","-3.74419979429472","0.415826614966402","0.401394160385454","0.415826614966404",NA,"0.364760344775465",NA,"0.512433013338314","0.603953926036966",NA,"0.715844266121001","0.436102026744885","0.0347078663594309","232","35",NA,"no_exp","0.00558738479778867"
 "lena","lucid","peak_lena_CVC","1.34062388492904","1.00211625362902","0.0828685496071044","12.0928417159495","0.340941222770085","0.237268988185273","0.340941222770084",NA,"0.228123156706293",NA,"0.440975038146281","0.477622399711626",NA,"0.66405951400931","0.541345549366389","0.304076561181116","226","35",NA,"no_exp","0.0080553338304956"
 "lena","lucid","peak_lena_CVC","1.34062388492904","1.00211625362902","0.0828685496071044","12.0928417159495","0.340941222770085","0.237268988185273","0.340941222770084",NA,"0.228123156706293",NA,"0.440975038146281","0.477622399711626",NA,"0.66405951400931","0.541345549366389","0.304076561181116","226","35",NA,"no_exp","0.0080553338304956"
-"lena","lucid","lena_CVC","1.26669781766672","0.849598151020215","0.0916258008666615","9.27247721694235","0.380674339675901","0.302260481451957","0.380674339675899",NA,"0.303848880923878",NA,"0.49433699412767","0.551224891422619",NA,"0.703091028336779","0.508247200416792","0.205986718964835","215","35",NA,"no_exp","0.0322694485400478"
 "lena","lucid","lp_dur","1.22411564170662","1.01918099474414","0.0632294262315494","16.1187765805726","0.38260354742774","0.22575125332591","0.382603547427739",NA,"0.166497039121078",NA,"0.26867153221195","0.408040487110137",NA,"0.518335347253059","0.635711629167573","0.409960375841663","235","35",NA,"no_exp","0.00660558907070592"
 "lena","lucid","lp_dur","1.22411564170662","1.01918099474414","0.0632294262315494","16.1187765805726","0.38260354742774","0.22575125332591","0.382603547427739",NA,"0.166497039121078",NA,"0.26867153221195","0.408040487110137",NA,"0.518335347253059","0.635711629167573","0.409960375841663","235","35",NA,"no_exp","0.00660558907070592"
 "lena","lucid","lp_n","1.35126889245206","1.0569019982432","0.0654991461233096","16.1361187251734","0.413008267970044","0.248458410210713","0.413008267970042",NA,"0.202768257377782",NA,"0.28818621763648","0.450297965105087",NA,"0.536829784602606","0.646876239878148","0.398417829667435","235","35",NA,"no_exp","0.000180787624908103"
 "lena","lucid","lp_n","1.35126889245206","1.0569019982432","0.0654991461233096","16.1361187251734","0.413008267970044","0.248458410210713","0.413008267970042",NA,"0.202768257377782",NA,"0.28818621763648","0.450297965105087",NA,"0.536829784602606","0.646876239878148","0.398417829667435","235","35",NA,"no_exp","0.000180787624908103"
 "lena","lucid","peak_wc_adu_ph","1.02994263690616","-0.215390128602509","0.0823401088621041","-2.615859167289","0.284415060220497","0.278467100240012","0.284415060220496",NA,"0.18128449548061",NA,"0.456109654252766","0.425775170108133",NA,"0.675358907731856","0.299380057436699","0.020912957196687","233","35",NA,"no_exp","7.91636295503749e-05"
 "lena","lucid","peak_wc_adu_ph","1.02994263690616","-0.215390128602509","0.0823401088621041","-2.615859167289","0.284415060220497","0.278467100240012","0.284415060220496",NA,"0.18128449548061",NA,"0.456109654252766","0.425775170108133",NA,"0.675358907731856","0.299380057436699","0.020912957196687","233","35",NA,"no_exp","7.91636295503749e-05"
@@ -440,12 +431,12 @@
 "lena","lucid","peak_voc_mal_ph","1.18850283898411","0.0485656338412704","0.0994005278885569","0.488585270852081","0.18606424227288","0.185908412947879","0.18606424227288",NA,"0.152400534142139",NA,"0.666674277226667","0.390385110041532",NA,"0.81650124141159","0.186745915753882","0.000837502806002635","235","35",NA,"no_exp","0.000877817691142488"
 "lena","lucid","peak_voc_mal_ph","1.18850283898411","0.0485656338412704","0.0994005278885569","0.488585270852081","0.18606424227288","0.185908412947879","0.18606424227288",NA,"0.152400534142139",NA,"0.666674277226667","0.390385110041532",NA,"0.81650124141159","0.186745915753882","0.000837502806002635","235","35",NA,"no_exp","0.000877817691142488"
 "lena","lucid","voc_mal_ph","1.11641281941121","-0.0667925603251801","0.0891734503959371","-0.749018458169061","0.244917186392779","0.244461376202139","0.244917186392781",NA,"0.171381713772371",NA,"0.52837201236068","0.413982745742345",NA,"0.726892022490741","0.2463224550319","0.00186107882976154","231","35",NA,"no_exp","0.000217078770032427"
 "lena","lucid","voc_mal_ph","1.11641281941121","-0.0667925603251801","0.0891734503959371","-0.749018458169061","0.244917186392779","0.244461376202139","0.244917186392781",NA,"0.171381713772371",NA,"0.52837201236068","0.413982745742345",NA,"0.726892022490741","0.2463224550319","0.00186107882976154","231","35",NA,"no_exp","0.000217078770032427"
 "lena","lucid","peak_voc_fem_ph","1.2580468114611","-0.288686269357728","0.0900447923154535","-3.20602959853996","0.303214461633859","0.294089353877754","0.30321446163386",NA,"0.23714816239337",NA,"0.544965464758536","0.486978605683422",NA,"0.738217762424161","0.324183920300921","0.030094566423167","234","35",NA,"no_exp","0.00335445600363328"
 "lena","lucid","peak_voc_fem_ph","1.2580468114611","-0.288686269357728","0.0900447923154535","-3.20602959853996","0.303214461633859","0.294089353877754","0.30321446163386",NA,"0.23714816239337",NA,"0.544965464758536","0.486978605683422",NA,"0.738217762424161","0.324183920300921","0.030094566423167","234","35",NA,"no_exp","0.00335445600363328"
-"lena","lucid","lena_CTC","1.22717333047646","0.549074740166319","0.0879821019473659","6.24075497190094","0.374441813671294","0.336277292886078","0.374441813671294",NA,"0.292646854191247",NA,"0.488908099092226","0.540968441030756",NA,"0.699219635802818","0.438201061524585","0.101923768638507","220","35",NA,"no_exp","0.376326780177084"
 "lena","lucid","peak_lena_CTC","1.28345316168501","0.648805906916977","0.0978391870179397","6.63135014396647","0.2629448729995","0.229598350427785","0.262944872999499",NA,"0.225545039345866",NA,"0.632220456413754","0.47491582343176",NA,"0.795122919059534","0.356417794333728","0.126819443905943","227","35",NA,"no_exp","0.0311221024403885"
 "lena","lucid","peak_lena_CTC","1.28345316168501","0.648805906916977","0.0978391870179397","6.63135014396647","0.2629448729995","0.229598350427785","0.262944872999499",NA,"0.225545039345866",NA,"0.632220456413754","0.47491582343176",NA,"0.795122919059534","0.356417794333728","0.126819443905943","227","35",NA,"no_exp","0.0311221024403885"
 "lena","lucid","standardScore","1.12549321622058","0.0764589152628511","0.0937178203036491","0.815841800578817","0.250975617990151","0.250372826643466","0.250975617990152",NA,"0.176825480647935",NA,"0.527726945854603","0.420506219511597",NA,"0.726448171485484","0.252774619102479","0.00240179245901318","213","35",NA,"no_exp","0.931113025625979"
 "lena","lucid","standardScore","1.12549321622058","0.0764589152628511","0.0937178203036491","0.815841800578817","0.250975617990151","0.250372826643466","0.250975617990152",NA,"0.176825480647935",NA,"0.527726945854603","0.420506219511597",NA,"0.726448171485484","0.252774619102479","0.00240179245901318","213","35",NA,"no_exp","0.931113025625979"
+"lena","lucid","lena_CTC_ph","1.31649302490112","0.470751425962887","0.0862519706435529","5.45786284592066","0.366499052669316","0.337752517542507","0.366499052669317",NA,"0.281190044295111",NA,"0.486042619055924","0.53027355609639",NA,"0.697167568849788","0.416188013944037","0.0784354964015295","227","35",NA,"no_exp","0.350805352618184"
+"lena","lucid","lena_CVC_ph","1.268803011538","0.770380424615168","0.0842580003536906","9.14311307390793","0.372059521334675","0.299911934422034","0.372059521334676",NA,"0.265980486400851",NA,"0.44890643665573","0.515732960359187",NA,"0.670004803457207","0.493826033579687","0.193914099157653","224","35",NA,"no_exp","0.0151150913684032"
 "lena","lyon","voc_fem_ph","0.878888308440088","0.136681513365658","0.131125861314683","1.04236885077645","0.251894323326016","0.24353590032014","0.251894323326015",NA,"0.153870636250235",NA,"0.45698328939019","0.392263478098886",NA,"0.676005391539291","0.27671816062482","0.03318226030468","54","16",NA,"no_exp","0.911296416776748"
 "lena","lyon","voc_fem_ph","0.878888308440088","0.136681513365658","0.131125861314683","1.04236885077645","0.251894323326016","0.24353590032014","0.251894323326015",NA,"0.153870636250235",NA,"0.45698328939019","0.392263478098886",NA,"0.676005391539291","0.27671816062482","0.03318226030468","54","16",NA,"no_exp","0.911296416776748"
 "lena","lyon","peak_lena_CVC","1.72428927305017","0.59506703589883","0.199293012204997","2.98589011885038","0.455351962061047","0.334315482347075","0.455351962061047",NA,"0.499802438580787",NA,"0.597815404809071","0.706967070365223",NA,"0.773185233180944","0.600124109076447","0.265808626729372","54","16",NA,"no_exp","0.0100706501972419"
 "lena","lyon","peak_lena_CVC","1.72428927305017","0.59506703589883","0.199293012204997","2.98589011885038","0.455351962061047","0.334315482347075","0.455351962061047",NA,"0.499802438580787",NA,"0.597815404809071","0.706967070365223",NA,"0.773185233180944","0.600124109076447","0.265808626729372","54","16",NA,"no_exp","0.0100706501972419"
-"lena","lyon","lena_CVC","1.5172453558479","0.488667530454491","0.192186044256827","2.54267958084127","0.488494978785961","0.384288082708492","0.488494978785961",NA,"0.482754903932794",NA,"0.50549456616937","0.694805659111088",NA,"0.710981410565262","0.597610431151972","0.213322348443479","54","16",NA,"no_exp","9.85441661659465e-05"
 "lena","lyon","lp_dur","2.26524373239595","0.990973627487602","0.168387168043791","5.88508993292106","0.705743743700322","0.26691225708104","0.705743743700322",NA,"0.454945568744439",NA,"0.189687235733699","0.674496529823867",NA,"0.43553098137067","0.888712295035924","0.621800037954883","52","16",NA,"no_exp","0.419182936550476"
 "lena","lyon","lp_dur","2.26524373239595","0.990973627487602","0.168387168043791","5.88508993292106","0.705743743700322","0.26691225708104","0.705743743700322",NA,"0.454945568744439",NA,"0.189687235733699","0.674496529823867",NA,"0.43553098137067","0.888712295035924","0.621800037954883","52","16",NA,"no_exp","0.419182936550476"
 "lena","lyon","lp_n","2.51890701476622","0.906298626244227","0.181833756709846","4.98421548695392","0.747751595248551","0.333604578511657","0.74775159524855",NA,"0.561626269915243",NA,"0.189460419145661","0.749417286907129",NA,"0.435270512607575","0.887460992016509","0.553856413504852","52","16",NA,"no_exp","0.0272241996384273"
 "lena","lyon","lp_n","2.51890701476622","0.906298626244227","0.181833756709846","4.98421548695392","0.747751595248551","0.333604578511657","0.74775159524855",NA,"0.561626269915243",NA,"0.189460419145661","0.749417286907129",NA,"0.435270512607575","0.887460992016509","0.553856413504852","52","16",NA,"no_exp","0.0272241996384273"
 "lena","lyon","peak_wc_adu_ph","1.17408757672888","-0.0746886663998239","0.146008571585766","-0.511536176189161","0.300358040647961","0.297721598894084","0.300358040647961",NA,"0.212334224979233",NA,"0.494602817628868","0.460797379527307",NA,"0.703280042109023","0.306499262206142","0.00877766331205857","54","16",NA,"no_exp","0.171639981354037"
 "lena","lyon","peak_wc_adu_ph","1.17408757672888","-0.0746886663998239","0.146008571585766","-0.511536176189161","0.300358040647961","0.297721598894084","0.300358040647961",NA,"0.212334224979233",NA,"0.494602817628868","0.460797379527307",NA,"0.703280042109023","0.306499262206142","0.00877766331205857","54","16",NA,"no_exp","0.171639981354037"
@@ -467,12 +458,12 @@
 "lena","lyon","peak_voc_mal_ph","0.912520906336113","-0.145741819411955","0.160519198349196","-0.907940115019178","0.327439367630662","0.318237559020744","0.327439367630662",NA,"0.269933429444141",NA,"0.554443405257711","0.519551180774465",NA,"0.744609565650154","0.346339887328124","0.02810232830738","54","16",NA,"no_exp","0.00012386651730328"
 "lena","lyon","peak_voc_mal_ph","0.912520906336113","-0.145741819411955","0.160519198349196","-0.907940115019178","0.327439367630662","0.318237559020744","0.327439367630662",NA,"0.269933429444141",NA,"0.554443405257711","0.519551180774465",NA,"0.744609565650154","0.346339887328124","0.02810232830738","54","16",NA,"no_exp","0.00012386651730328"
 "lena","lyon","voc_mal_ph","1.02234726802092","-0.113171532777885","0.13555713133615","-0.834862258166606","0.232403961542677","0.227540631517427","0.232403961542677",NA,"0.156286802909525",NA,"0.516192279943052","0.395331257187596",NA,"0.718465225284462","0.248466823966851","0.0209261924494242","54","16",NA,"no_exp","0.0124840649485656"
 "lena","lyon","voc_mal_ph","1.02234726802092","-0.113171532777885","0.13555713133615","-0.834862258166606","0.232403961542677","0.227540631517427","0.232403961542677",NA,"0.156286802909525",NA,"0.516192279943052","0.395331257187596",NA,"0.718465225284462","0.248466823966851","0.0209261924494242","54","16",NA,"no_exp","0.0124840649485656"
 "lena","lyon","peak_voc_fem_ph","1.18004127038106","0.0944751698630692","0.113414019103268","0.833011391449285","0.077446832849523","0.0762305877152521","0.0774468328495229",NA,"0.0486212751382634",NA,"0.579180706548105","0.220502324564308",NA,"0.761039227995578","0.0919348468762952","0.0157042591610431","54","16",NA,"no_exp","0.296950656130724"
 "lena","lyon","peak_voc_fem_ph","1.18004127038106","0.0944751698630692","0.113414019103268","0.833011391449285","0.077446832849523","0.0762305877152521","0.0774468328495229",NA,"0.0486212751382634",NA,"0.579180706548105","0.220502324564308",NA,"0.761039227995578","0.0919348468762952","0.0157042591610431","54","16",NA,"no_exp","0.296950656130724"
-"lena","lyon","lena_CTC","0.993762841106293",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "lena","lyon","peak_lena_CTC","1.27310273296175","0.466878561921155","0.116617060161977","4.0035185355614","0.111229547667135","0.0796639043136365","0.111229547667135",NA,"0.068667959957837",NA,"0.548685624571091","0.262045721121023",NA,"0.740733166917137","0.363452196323611","0.283788292009975","54","16",NA,"no_exp","0.0304569144338614"
 "lena","lyon","peak_lena_CTC","1.27310273296175","0.466878561921155","0.116617060161977","4.0035185355614","0.111229547667135","0.0796639043136365","0.111229547667135",NA,"0.068667959957837",NA,"0.548685624571091","0.262045721121023",NA,"0.740733166917137","0.363452196323611","0.283788292009975","54","16",NA,"no_exp","0.0304569144338614"
 "lena","lyon","standardScore","1.39501922326288","0.399308592179057","0.191112225964898","2.08939323563945","0.341059174477198","0.290400538716571","0.341059174477198",NA,"0.324993700021883",NA,"0.62790164583726","0.570082187076463",NA,"0.79240245193794","0.438933812563493","0.148533273846922","45","15",NA,"no_exp","0.883976852012427"
 "lena","lyon","standardScore","1.39501922326288","0.399308592179057","0.191112225964898","2.08939323563945","0.341059174477198","0.290400538716571","0.341059174477198",NA,"0.324993700021883",NA,"0.62790164583726","0.570082187076463",NA,"0.79240245193794","0.438933812563493","0.148533273846922","45","15",NA,"no_exp","0.883976852012427"
+"lena","lyon","lena_CTC_ph","1.14738130568859","0.429422643269549","0.113425578656288","3.78594183390348","0.135448200972858","0.0987376498991772","0.135448200972858",NA,"0.0753900744572332",NA,"0.48120701517366","0.2745725304127",NA,"0.693690864271442","0.36976783568243","0.271030185783252","54","16",NA,"no_exp","0.000928834888426137"
+"lena","lyon","lena_CVC_ph","1.19634598676742","0.489239600177419","0.214887497510359","2.27672435970284","0.579714964313324","0.469919313865168","0.579714964313324",NA,"0.656594527892671",NA,"0.476021616785276","0.810305206630607",NA,"0.68994319823104","0.659315236356508","0.18939592249134","53","16",NA,"no_exp","0.000160471044267879"
 "lena","warlaumont","voc_fem_ph","1.63383541016697","-0.630549219217165","0.347255329346944","-1.81580861668269","0.671365770669538","0.648561876940596","0.671365770669538",NA,"0.767155955112728",NA,"0.37552362229209","0.87587439459818",NA,"0.612799822366236","0.682528299902852","0.0339664229622562","37","13",NA,"no_exp","0.146933838678041"
 "lena","warlaumont","voc_fem_ph","1.63383541016697","-0.630549219217165","0.347255329346944","-1.81580861668269","0.671365770669538","0.648561876940596","0.671365770669538",NA,"0.767155955112728",NA,"0.37552362229209","0.87587439459818",NA,"0.612799822366236","0.682528299902852","0.0339664229622562","37","13",NA,"no_exp","0.146933838678041"
 "lena","warlaumont","peak_lena_CVC","0.887869327299492","-0.661690498862921","0.39038545076532","-1.6949671089579","0.282442152238748","0.266072549051008","0.282442152238748",NA,"0.197667381072578",NA,"0.502183471591545","0.444597999402356",NA,"0.708649046843037","0.32402991503901","0.0579573659880013","38","13",NA,"no_exp","0.000302376406726965"
 "lena","warlaumont","peak_lena_CVC","0.887869327299492","-0.661690498862921","0.39038545076532","-1.6949671089579","0.282442152238748","0.266072549051008","0.282442152238748",NA,"0.197667381072578",NA,"0.502183471591545","0.444597999402356",NA,"0.708649046843037","0.32402991503901","0.0579573659880013","38","13",NA,"no_exp","0.000302376406726965"
-"lena","warlaumont","lena_CVC","0.901040462334855","-0.0488012353066104","0.241883805536309","-0.201754868203795","0.555107912426215","0.554794595048083","0.555107912426215",NA,"0.230208082067511",NA,"0.184500620356381","0.479800043838588",NA,"0.429535354023834","0.555359021119337","0.000564426071253866","38","13",NA,"no_exp","0.295831238873014"
 "lena","warlaumont","lp_dur","1.30434481122876",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "lena","warlaumont","lp_dur","1.30434481122876",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "lena","warlaumont","lp_n","1.26430134925892","0.180692238413939","0.370441406812027","0.487775489162927","0.288932814718663","0.287438539892882","0.288932814718662",NA,"0.179269910712338",NA,"0.441185439390056","0.42340277598563",NA,"0.664217915589497","0.292610243312015","0.00517170341913315","37","13",NA,"no_exp","0.0785300932724228"
 "lena","warlaumont","lp_n","1.26430134925892","0.180692238413939","0.370441406812027","0.487775489162927","0.288932814718663","0.287438539892882","0.288932814718662",NA,"0.179269910712338",NA,"0.441185439390056","0.42340277598563",NA,"0.664217915589497","0.292610243312015","0.00517170341913315","37","13",NA,"no_exp","0.0785300932724228"
 "lena","warlaumont","peak_wc_adu_ph","2.04052112798255","-0.817834934544693","0.45965308532325","-1.77924387034094","0.672123039195554","0.647465062550561","0.672123039195554",NA,"1.23790277014505",NA,"0.60387722839013","1.11261079005421",NA,"0.777095379210384","0.684151763060792","0.0366867005102306","33","13",NA,"no_exp","0.493602805299678"
 "lena","warlaumont","peak_wc_adu_ph","2.04052112798255","-0.817834934544693","0.45965308532325","-1.77924387034094","0.672123039195554","0.647465062550561","0.672123039195554",NA,"1.23790277014505",NA,"0.60387722839013","1.11261079005421",NA,"0.777095379210384","0.684151763060792","0.0366867005102306","33","13",NA,"no_exp","0.493602805299678"
@@ -494,12 +485,12 @@
 "lena","warlaumont","peak_voc_mal_ph","1.20185680346708","-0.551132479506802","0.377447878682206","-1.46015519131008","0.605992732140648","0.589988648848038","0.605992732140648",NA,"0.670361863890225",NA,"0.435859099391291","0.81875629090116",NA,"0.660196258237875","0.616398343954571","0.0264096951065331","37","13",NA,"no_exp","0.0701689274988425"
 "lena","warlaumont","peak_voc_mal_ph","1.20185680346708","-0.551132479506802","0.377447878682206","-1.46015519131008","0.605992732140648","0.589988648848038","0.605992732140648",NA,"0.670361863890225",NA,"0.435859099391291","0.81875629090116",NA,"0.660196258237875","0.616398343954571","0.0264096951065331","37","13",NA,"no_exp","0.0701689274988425"
 "lena","warlaumont","voc_mal_ph","1.25608791538144","0.0166977857033478","0.317568910100668","0.0525800390789345","0.640536982343847","0.64051694299496","0.640536982343848",NA,"0.561361690821983",NA,"0.315030627335593","0.749240742900427",NA,"0.561275892352053","0.640548228228194","3.12852332337354e-05","38","13",NA,"no_exp","0.131090869894561"
 "lena","warlaumont","voc_mal_ph","1.25608791538144","0.0166977857033478","0.317568910100668","0.0525800390789345","0.640536982343847","0.64051694299496","0.640536982343848",NA,"0.561361690821983",NA,"0.315030627335593","0.749240742900427",NA,"0.561275892352053","0.640548228228194","3.12852332337354e-05","38","13",NA,"no_exp","0.131090869894561"
 "lena","warlaumont","peak_voc_fem_ph","1.9020074484623","-1.02938406999466","0.413033610148928","-2.49225255451607","0.646262578855277","0.599748783375867","0.646262578855277",NA,"0.923312584428519",NA,"0.505383141794682","0.96089155705965",NA,"0.710903046691095","0.671722307762502","0.0719735243866348","34","13",NA,"no_exp","0.963229167520024"
 "lena","warlaumont","peak_voc_fem_ph","1.9020074484623","-1.02938406999466","0.413033610148928","-2.49225255451607","0.646262578855277","0.599748783375867","0.646262578855277",NA,"0.923312584428519",NA,"0.505383141794682","0.96089155705965",NA,"0.710903046691095","0.671722307762502","0.0719735243866348","34","13",NA,"no_exp","0.963229167520024"
-"lena","warlaumont","lena_CTC","0.674591679505429","-0.276510751910454","0.193027076500745","-1.43249722745185","0.660834074772862","0.6466367860089","0.660834074772863",NA,"0.22631078270581",NA,"0.116151555943413","0.475721328832133",NA,"0.340810146479551","0.668120679327873","0.0214838933189739","38","13",NA,"no_exp","0.00335132887353038"
 "lena","warlaumont","peak_lena_CTC","1.10232065902785","-0.865269533277662","0.403815605390207","-2.14273426219265","0.199251209551061","0.179909505096799","0.199251209551061",NA,"0.136457351266706",NA,"0.548393453775642","0.369401341722937",NA,"0.740535923352569","0.276981460132061","0.0970719550352622","38","13",NA,"no_exp","0.00274296613018859"
 "lena","warlaumont","peak_lena_CTC","1.10232065902785","-0.865269533277662","0.403815605390207","-2.14273426219265","0.199251209551061","0.179909505096799","0.199251209551061",NA,"0.136457351266706",NA,"0.548393453775642","0.369401341722937",NA,"0.740535923352569","0.276981460132061","0.0970719550352622","38","13",NA,"no_exp","0.00274296613018859"
 "lena","warlaumont","standardScore","1.95528312574916","-1.19313141083961","0.561391976885114","-2.12530898189837","0.11124965705866","0.0992329031512094","0.11124965705866",NA,"0.133516951576979",NA,"1.06663912177234","0.365399714801447",NA,"1.03278222378793","0.20724900158389","0.10801609843268","36","13",NA,"no_exp","0.0988266983074217"
 "lena","warlaumont","standardScore","1.95528312574916","-1.19313141083961","0.561391976885114","-2.12530898189837","0.11124965705866","0.0992329031512094","0.11124965705866",NA,"0.133516951576979",NA,"1.06663912177234","0.365399714801447",NA,"1.03278222378793","0.20724900158389","0.10801609843268","36","13",NA,"no_exp","0.0988266983074217"
+"lena","warlaumont","lena_CTC_ph","0.589315183628168","-0.0839020289904269","0.200038974821773","-0.419428409214656","0.66740514567884","0.666174747574326","0.667405145678841",NA,"0.250155911620968",NA,"0.124662762224475","0.500155887320111",NA,"0.35307614224764","0.668018302591066","0.00184355501673927","38","13",NA,"no_exp","0.149565888751685"
+"lena","warlaumont","lena_CVC_ph","0.901213751236309","0.161504420110592","0.277479782214183","0.582040315953284","0.59209571277219","0.589544265666345","0.59209571277219",NA,"0.350933131927234",NA,"0.241763495251785","0.592396093781208",NA,"0.491694514156692","0.59385344583909","0.00430918017274538","38","13",NA,"no_exp","0.234252968541846"
 "lena","winnipeg","voc_fem_ph","1.26087041863769","-0.74512571684412","0.43066602018476","-1.73017067035949","0.738546698931857","0.578847986004281","0.738546698931857",NA,"0.780548391136599",NA,"0.276322341974101","0.883486497427436",NA,"0.525663715672008","0.795081723367869","0.216233737363588","35","10",NA,"no_exp","0.820207357247447"
 "lena","winnipeg","voc_fem_ph","1.26087041863769","-0.74512571684412","0.43066602018476","-1.73017067035949","0.738546698931857","0.578847986004281","0.738546698931857",NA,"0.780548391136599",NA,"0.276322341974101","0.883486497427436",NA,"0.525663715672008","0.795081723367869","0.216233737363588","35","10",NA,"no_exp","0.820207357247447"
 "lena","winnipeg","peak_lena_CVC","0.812900228471224","0.355946316094303","0.212340059932462","1.676303172409","0.502876376270706","0.413592760833285","0.502876376270705",NA,"0.15995340227809",NA,"0.158123584086417","0.399941748606082",NA,"0.397647562656201","0.591138614348102","0.177545853514818","36","10",NA,"no_exp","0.96811177784662"
 "lena","winnipeg","peak_lena_CVC","0.812900228471224","0.355946316094303","0.212340059932462","1.676303172409","0.502876376270706","0.413592760833285","0.502876376270705",NA,"0.15995340227809",NA,"0.158123584086417","0.399941748606082",NA,"0.397647562656201","0.591138614348102","0.177545853514818","36","10",NA,"no_exp","0.96811177784662"
-"lena","winnipeg","lena_CVC","1.02766126120061","-0.0357210356009205","0.249094597789011","-0.143403493764955","0.626218904610395","0.625104015589706","0.626218904610395",NA,"0.242804644124849",NA,"0.144926614604734","0.492752112247983",NA,"0.38069228335328","0.626884365899287","0.00178035030958117","36","10",NA,"no_exp","0.117659239474465"
 "lena","winnipeg","lp_dur","1.49123788484982","0.47653176462977","0.349119451431062","1.36495334956685","0.538133730930965","0.468475234687755","0.538133730930965",NA,"0.445398295178161",NA,"0.382273842020203","0.667381671293242",NA,"0.618282978918393","0.59791981739901","0.129444582711255","36","10",NA,"no_exp","0.341651619502249"
 "lena","winnipeg","lp_dur","1.49123788484982","0.47653176462977","0.349119451431062","1.36495334956685","0.538133730930965","0.468475234687755","0.538133730930965",NA,"0.445398295178161",NA,"0.382273842020203","0.667381671293242",NA,"0.618282978918393","0.59791981739901","0.129444582711255","36","10",NA,"no_exp","0.341651619502249"
 "lena","winnipeg","lp_n","1.39273253328548","0.353527123557186","0.36240025024205","0.975515671749847","0.540372114940662","0.502145871089732","0.540372114940661",NA,"0.480804763606288",NA,"0.40896128892047","0.693400867901308",NA,"0.639500812290704","0.572886464088553","0.0707405929988215","36","10",NA,"no_exp","0.451064183674093"
 "lena","winnipeg","lp_n","1.39273253328548","0.353527123557186","0.36240025024205","0.975515671749847","0.540372114940662","0.502145871089732","0.540372114940661",NA,"0.480804763606288",NA,"0.40896128892047","0.693400867901308",NA,"0.639500812290704","0.572886464088553","0.0707405929988215","36","10",NA,"no_exp","0.451064183674093"
 "lena","winnipeg","peak_wc_adu_ph","0.947973476041135","-0.443914831048874","0.354356079395891","-1.25273660270106","0.51328902351978","0.457492154454675","0.51328902351978",NA,"0.449466357295161",NA,"0.426193040626564","0.670422521470722",NA,"0.652834619659959","0.566196737074597","0.108704582619921","36","10",NA,"no_exp","0.138920236680597"
 "lena","winnipeg","peak_wc_adu_ph","0.947973476041135","-0.443914831048874","0.354356079395891","-1.25273660270106","0.51328902351978","0.457492154454675","0.51328902351978",NA,"0.449466357295161",NA,"0.426193040626564","0.670422521470722",NA,"0.652834619659959","0.566196737074597","0.108704582619921","36","10",NA,"no_exp","0.138920236680597"
@@ -521,12 +512,12 @@
 "lena","winnipeg","peak_voc_mal_ph","0.948131478290695","-0.400944583476837","0.1845561348839","-2.1724803877642","0.231838959532346","0.18636211893875","0.231838959532346",NA,"0.0827722112585458",NA,"0.274252386442849","0.287701601070529",NA,"0.523691117399225","0.382519143993254","0.196157025054504","36","10",NA,"no_exp","0.862449924151584"
 "lena","winnipeg","peak_voc_mal_ph","0.948131478290695","-0.400944583476837","0.1845561348839","-2.1724803877642","0.231838959532346","0.18636211893875","0.231838959532346",NA,"0.0827722112585458",NA,"0.274252386442849","0.287701601070529",NA,"0.523691117399225","0.382519143993254","0.196157025054504","36","10",NA,"no_exp","0.862449924151584"
 "lena","winnipeg","voc_mal_ph","1.14741740802858","-0.474553467658915","0.212425086926819","-2.23398033878362","0.307840346485045","0.237795729177898","0.307840346485045",NA,"0.127551980916388",NA,"0.286792605076939","0.357144201851841",NA,"0.53553020930377","0.465331262147907","0.22753553297001","36","10",NA,"no_exp","0.272085444186776"
 "lena","winnipeg","voc_mal_ph","1.14741740802858","-0.474553467658915","0.212425086926819","-2.23398033878362","0.307840346485045","0.237795729177898","0.307840346485045",NA,"0.127551980916388",NA,"0.286792605076939","0.357144201851841",NA,"0.53553020930377","0.465331262147907","0.22753553297001","36","10",NA,"no_exp","0.272085444186776"
 "lena","winnipeg","peak_voc_fem_ph","1.37754466162627","-0.409776921436332","0.434343505669302","-0.943439733960994","0.581829143879791","0.541643746120245","0.58182914387979",NA,"0.713670928861439",NA,"0.512927869717973","0.844790464471184",NA,"0.716189827991136","0.610711097218505","0.0690673510982596","36","10",NA,"no_exp","0.284701037701721"
 "lena","winnipeg","peak_voc_fem_ph","1.37754466162627","-0.409776921436332","0.434343505669302","-0.943439733960994","0.581829143879791","0.541643746120245","0.58182914387979",NA,"0.713670928861439",NA,"0.512927869717973","0.844790464471184",NA,"0.716189827991136","0.610711097218505","0.0690673510982596","36","10",NA,"no_exp","0.284701037701721"
-"lena","winnipeg","lena_CTC","0.709956905167575","-0.391261765246073","0.259021100865175","-1.51054012178618","0.863609935980341","0.711390944953242","0.863609935980341",NA,"0.334852870933917",NA,"0.0528833708380162","0.578664731026453",NA,"0.229963846806441","0.887649907113404","0.176258962160161","36","10",NA,"no_exp","0.378687072055071"
 "lena","winnipeg","peak_lena_CTC","0.693478724458835","0.0633683731122525","0.257015351339322","0.246554817764917","0.693543063011204","0.689718638892693","0.693543063011204",NA,"0.272199011434084",NA,"0.120276994673249","0.521726951032898",NA,"0.34680973843485","0.695232967162241","0.00551432826954778","36","10",NA,"no_exp","0.133601851173249"
 "lena","winnipeg","peak_lena_CTC","0.693478724458835","0.0633683731122525","0.257015351339322","0.246554817764917","0.693543063011204","0.689718638892693","0.693543063011204",NA,"0.272199011434084",NA,"0.120276994673249","0.521726951032898",NA,"0.34680973843485","0.695232967162241","0.00551432826954778","36","10",NA,"no_exp","0.133601851173249"
 "lena","winnipeg","standardScore","1.6188982918145","0.0237707049749344","0.46116914151559","0.0515444396318759","0.418488179101832","0.418408203716143","0.418488179101832",NA,"0.667521970794657",NA,"0.927557661388279","0.817020177715739",NA,"0.963097950048841","0.418599309199363","0.000191105483220609","32","10",NA,"no_exp","0.789148930076198"
 "lena","winnipeg","standardScore","1.6188982918145","0.0237707049749344","0.46116914151559","0.0515444396318759","0.418488179101832","0.418408203716143","0.418488179101832",NA,"0.667521970794657",NA,"0.927557661388279","0.817020177715739",NA,"0.963097950048841","0.418599309199363","0.000191105483220609","32","10",NA,"no_exp","0.789148930076198"
+"lena","winnipeg","lena_CTC_ph","0.639375496589207","-0.0835068245855258","0.251160093289896","-0.33248444644086","0.691500655302652","0.684606640458689","0.691500655302652",NA,"0.259518015100631",NA,"0.115778831128744","0.50942910704104",NA,"0.340262885323603","0.694576283713685","0.00996964325499601","36","10",NA,"no_exp","0.195407767533849"
+"lena","winnipeg","lena_CVC_ph","0.889930627373244","0.267025049973563","0.210053104017949","1.27122639402056","0.45773809910303","0.409512962414422","0.457738099103029",NA,"0.150202561892281",NA,"0.177938272761015","0.387559752673418",NA,"0.421827302057388","0.514868266644304","0.105355304229882","36","10",NA,"no_exp","0.402314605773761"
 "lena","quechua","voc_fem_ph","1.33727232706971","0.04905152900626","0.0698996056764102","0.701742571100282","0.0188343068532066","0.0186199317006687","0.0188343068532066",NA,"0.0115967462405136",NA,"0.604127863690605","0.107688189884098",NA,"0.777256626662394","0.0300020948038149","0.0113821631031462","45","19",NA,"no_exp","0.0233557157973061"
 "lena","quechua","voc_fem_ph","1.33727232706971","0.04905152900626","0.0698996056764102","0.701742571100282","0.0188343068532066","0.0186199317006687","0.0188343068532066",NA,"0.0115967462405136",NA,"0.604127863690605","0.107688189884098",NA,"0.777256626662394","0.0300020948038149","0.0113821631031462","45","19",NA,"no_exp","0.0233557157973061"
 "lena","quechua","peak_lena_CVC","1.18480575795264","0.179897357950644","0.0735536106361788","2.44579914425245","0.0340688476924013","0.0297332868233416","0.0340688476924013",NA,"0.0216276221533598",NA,"0.613193442199327","0.147063327017172",NA,"0.783066690773734","0.156992092527731","0.12725880570439","44","19",NA,"no_exp","0.0381663998635709"
 "lena","quechua","peak_lena_CVC","1.18480575795264","0.179897357950644","0.0735536106361788","2.44579914425245","0.0340688476924013","0.0297332868233416","0.0340688476924013",NA,"0.0216276221533598",NA,"0.613193442199327","0.147063327017172",NA,"0.783066690773734","0.156992092527731","0.12725880570439","44","19",NA,"no_exp","0.0381663998635709"
-"lena","quechua","lena_CVC","1.11436099582049","0.0668110528214253","0.0758953775560898","0.880304637420759","0.03880002042581","0.0380568922304818","0.03880002042581",NA,"0.0267392425288717",NA,"0.662416129953473","0.163521382482144",NA,"0.813889507214261","0.0572096706871088","0.0191527784566269","43","19",NA,"no_exp","0.716244610734989"
 "lena","quechua","lp_dur","1.21632056549292","0.25531776092559","0.0821866896554136","3.10655851934258","0.548995219430669","0.394338635305661","0.548995219430669",NA,"0.268698399432941",NA,"0.220738284025965","0.518361263437905",NA,"0.469827930231872","0.676047070372534","0.281708435066873","46","19",NA,"no_exp","0.610358318849178"
 "lena","quechua","lp_dur","1.21632056549292","0.25531776092559","0.0821866896554136","3.10655851934258","0.548995219430669","0.394338635305661","0.548995219430669",NA,"0.268698399432941",NA,"0.220738284025965","0.518361263437905",NA,"0.469827930231872","0.676047070372534","0.281708435066873","46","19",NA,"no_exp","0.610358318849178"
 "lena","quechua","lp_n","1.04530024701997","0.235731423912052","0.0765126991092284","3.08094508044378","0.565905299166012","0.406838920702382","0.565905299166012",NA,"0.23684071690667",NA,"0.181675803888785","0.486662836989501",NA,"0.426234447093128","0.687921954733075","0.281083034030694","46","19",NA,"no_exp","0.481174386375168"
 "lena","quechua","lp_n","1.04530024701997","0.235731423912052","0.0765126991092284","3.08094508044378","0.565905299166012","0.406838920702382","0.565905299166012",NA,"0.23684071690667",NA,"0.181675803888785","0.486662836989501",NA,"0.426234447093128","0.687921954733075","0.281083034030694","46","19",NA,"no_exp","0.481174386375168"
 "lena","quechua","peak_wc_adu_ph","0.883205484423704",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "lena","quechua","peak_wc_adu_ph","0.883205484423704",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
@@ -548,6 +539,7 @@
 "lena","quechua","peak_voc_mal_ph","0.683277849378501","-0.0672110551615461","0.072412093681484","-0.928174449107693","0.291177714100204","0.283329651428319","0.291177714100204",NA,"0.139830744932572",NA,"0.340394004975493","0.373939493678553",NA,"0.583432948140138","0.310282478831805","0.0269528274034855","46","19",NA,"no_exp","0.000661587885771638"
 "lena","quechua","peak_voc_mal_ph","0.683277849378501","-0.0672110551615461","0.072412093681484","-0.928174449107693","0.291177714100204","0.283329651428319","0.291177714100204",NA,"0.139830744932572",NA,"0.340394004975493","0.373939493678553",NA,"0.583432948140138","0.310282478831805","0.0269528274034855","46","19",NA,"no_exp","0.000661587885771638"
 "lena","quechua","voc_mal_ph","0.608999633486328","0.00889375672351836","0.0465473084288231","0.191069194411489","0.167781408140976","0.167610026756792","0.167781408140976",NA,"0.0382194315085333",NA,"0.189573575666731","0.195497906660233",NA,"0.435400477338657","0.168631483103376","0.00102145634658456","46","19",NA,"no_exp","0.0222058767762607"
 "lena","quechua","voc_mal_ph","0.608999633486328","0.00889375672351836","0.0465473084288231","0.191069194411489","0.167781408140976","0.167610026756792","0.167781408140976",NA,"0.0382194315085333",NA,"0.189573575666731","0.195497906660233",NA,"0.435400477338657","0.168631483103376","0.00102145634658456","46","19",NA,"no_exp","0.0222058767762607"
 "lena","quechua","peak_voc_fem_ph","1.17672188565425",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
 "lena","quechua","peak_voc_fem_ph","1.17672188565425",NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,NA,"no_chi_effect",NA
-"lena","quechua","lena_CTC","1.02824393612689","0.10992094690701","0.0672642216663783","1.63416663694116","0.140681466035797","0.131191494193391","0.140681466035797",NA,"0.0691945850170212",NA,"0.422658300560773","0.263048636219657",NA,"0.65012175825823","0.198648651911602","0.0674571577182106","46","19",NA,"no_exp","0.204960815477131"
 "lena","quechua","peak_lena_CTC","1.20582494626051","0.131605755958313","0.0702008656792463","1.87470275024286","0.0655921389540143","0.060389934412116","0.0655921389540142",NA,"0.0388340104298487",NA,"0.553218803354357","0.197063468024514",NA,"0.743786799663961","0.139701337041408","0.0793114026292917","46","19",NA,"no_exp","0.0276164865660995"
 "lena","quechua","peak_lena_CTC","1.20582494626051","0.131605755958313","0.0702008656792463","1.87470275024286","0.0655921389540143","0.060389934412116","0.0655921389540142",NA,"0.0388340104298487",NA,"0.553218803354357","0.197063468024514",NA,"0.743786799663961","0.139701337041408","0.0793114026292917","46","19",NA,"no_exp","0.0276164865660995"
 "lena","quechua","standardScore","1.19337561472986","0.129554661423708","0.130077580013558","0.995979948352396","0.445162218915273","0.425975683342455","0.445162218915273",NA,"0.394027013495519",NA,"0.491104286405997","0.627715710728606",NA,"0.700788332098928","0.469075782042587","0.0431000987001312","36","16",NA,"no_exp","0.257137793159206"
 "lena","quechua","standardScore","1.19337561472986","0.129554661423708","0.130077580013558","0.995979948352396","0.445162218915273","0.425975683342455","0.445162218915273",NA,"0.394027013495519",NA,"0.491104286405997","0.627715710728606",NA,"0.700788332098928","0.469075782042587","0.0431000987001312","36","16",NA,"no_exp","0.257137793159206"
+"lena","quechua","lena_CTC_ph","1.00291932483181","0.155179287504736","0.0663567781808541","2.33855970345333","0.2964052494145","0.251876450784195","0.2964052494145",NA,"0.118886771040527",NA,"0.282208591728413","0.344799609977341",NA,"0.531233086063371","0.402105904271488","0.150229453487293","46","19",NA,"no_exp","0.347316332381785"
+"lena","quechua","lena_CVC_ph","1.23149782957208","0.1654155355195","0.0889410960776662","1.85983243758379","0.216855686515401","0.196674907620543","0.216855686515401",NA,"0.170281702350035",NA,"0.614948812404956","0.41265203543668",NA,"0.784186720370191","0.289735777820157","0.0930608701996142","46","19",NA,"no_exp","0.935024258305362"

+ 3 - 4
OUTPUT/df.icc.mixed.csv

@@ -21,8 +21,6 @@
 "aclew",NA,"cp_dur",1.5091220597277,0.434410885706191,0.0403765159746657,10.7589987699474,0.518339380579984,0.424622220636666,0.398988392796131,0.119350987783862,0.335082971807033,0.100234704559829,0.404513701831278,0.5788635174262,0.316598649017694,0.636013916381771,0.605424921443337,0.180802700806671,1245,191,8,"full",0.164056220291004
 "aclew",NA,"cp_dur",1.5091220597277,0.434410885706191,0.0403765159746657,10.7589987699474,0.518339380579984,0.424622220636666,0.398988392796131,0.119350987783862,0.335082971807033,0.100234704559829,0.404513701831278,0.5788635174262,0.316598649017694,0.636013916381771,0.605424921443337,0.180802700806671,1245,191,8,"full",0.164056220291004
 "aclew",NA,"avg_can_voc_dur_chi",1.33173611303315,-0.0490538456326353,0.043979172993209,-1.11538808699768,0.409660109252537,0.408727434297979,0.392353953313448,0.0173061559390947,0.412554230240014,0.0181971604505869,0.620733440176977,0.642303845730363,0.134896851151489,0.787866384723309,0.411004138652375,0.00227670435439597,1228,191,8,"full",4.19083127262851e-07
 "aclew",NA,"avg_can_voc_dur_chi",1.33173611303315,-0.0490538456326353,0.043979172993209,-1.11538808699768,0.409660109252537,0.408727434297979,0.392353953313448,0.0173061559390947,0.412554230240014,0.0181971604505869,0.620733440176977,0.642303845730363,0.134896851151489,0.787866384723309,0.411004138652375,0.00227670435439597,1228,191,8,"full",4.19083127262851e-07
 "aclew",NA,"can_voc_chi_ph",1.26029942826758,0.617614182772372,0.035165933208523,17.5628549116019,0.60142886480456,0.396185037072012,0.423048856275563,0.178380008529002,0.289202348691621,0.121943167227513,0.272469022689249,0.537775370105048,0.349203618577346,0.521985653719763,0.737445391776211,0.341260354704199,1216,191,8,"full",2.74622771533917e-12
 "aclew",NA,"can_voc_chi_ph",1.26029942826758,0.617614182772372,0.035165933208523,17.5628549116019,0.60142886480456,0.396185037072012,0.423048856275563,0.178380008529002,0.289202348691621,0.121943167227513,0.272469022689249,0.537775370105048,0.349203618577346,0.521985653719763,0.737445391776211,0.341260354704199,1216,191,8,"full",2.74622771533917e-12
-"aclew",NA,"voc_chi",1.40047815807443,0.426071194723197,0.0370541897105316,11.4985970021657,0.569118813369816,0.46034535266793,0.365823556671903,0.203295256697903,0.275654688339025,0.153186665002338,0.324676793075461,0.525028273847252,0.391390680781157,0.569804170812623,0.651471455243641,0.191126102575711,1242,191,8,"full",6.78905386390098e-06
-"aclew",NA,"simple_CTC",1.47591655295752,0.533515063640339,0.0345348183238148,15.4486135886933,0.599008857509623,0.426732479923682,0.356642385731142,0.242366471778476,0.2444856573989,0.166147178672371,0.274887638164247,0.494454909368792,0.407611553654175,0.524297280332682,0.714334867477982,0.2876023875543,1238,191,8,"full",1.58310970464183e-06
 "aclew",NA,"peak_voc_chi",1.3052115338496,0.505156336537043,0.0383068469149264,13.1871030173514,0.422824117229295,0.316464612774181,0.333180821775678,0.0896432954536128,0.239537048608345,0.0644481585285885,0.414954878705157,0.489425222693258,0.253866418670506,0.64416991446757,0.568010113896663,0.251545501122482,1225,190,8,"full",3.91282012613783e-09
 "aclew",NA,"peak_voc_chi",1.3052115338496,0.505156336537043,0.0383068469149264,13.1871030173514,0.422824117229295,0.316464612774181,0.333180821775678,0.0896432954536128,0.239537048608345,0.0644481585285885,0.414954878705157,0.489425222693258,0.253866418670506,0.64416991446757,0.568010113896663,0.251545501122482,1225,190,8,"full",3.91282012613783e-09
 "aclew",NA,"voc_fem_ph",1.45747376455369,0.160102840972138,0.0419742218494536,3.81431349808864,0.557399830871733,0.542985214783098,0.372868788692384,0.184531042179349,0.356228947829331,0.17629606175386,0.422848458597379,0.596849183487195,0.419876245760414,0.65026798982987,0.568845674887816,0.0258604601047186,1240,190,8,"full",0.000102584296420943
 "aclew",NA,"voc_fem_ph",1.45747376455369,0.160102840972138,0.0419742218494536,3.81431349808864,0.557399830871733,0.542985214783098,0.372868788692384,0.184531042179349,0.356228947829331,0.17629606175386,0.422848458597379,0.596849183487195,0.419876245760414,0.65026798982987,0.568845674887816,0.0258604601047186,1240,190,8,"full",0.000102584296420943
 "aclew",NA,"peak_voc_fem_ph",1.34706605098303,0.133908110318364,0.0455239404303699,2.94148768872897,0.295658448779726,0.290805054636012,0.211317009168655,0.0843414396110688,0.212989590853703,0.0850090051219526,0.709916439788045,0.461507953185753,0.29156303798999,0.842565391995212,0.30722059819225,0.0164155435562376,1227,191,8,"full",7.64031189116186e-06
 "aclew",NA,"peak_voc_fem_ph",1.34706605098303,0.133908110318364,0.0455239404303699,2.94148768872897,0.295658448779726,0.290805054636012,0.211317009168655,0.0843414396110688,0.212989590853703,0.0850090051219526,0.709916439788045,0.461507953185753,0.29156303798999,0.842565391995212,0.30722059819225,0.0164155435562376,1227,191,8,"full",7.64031189116186e-06
@@ -41,9 +39,9 @@
 "aclew",NA,"avg_voc_dur_och",1.57732385012919,0.328088243652795,0.0363815120015201,9.01799363476391,0.619026629010372,0.552665185167556,0.619026629010358,NA,0.550330079163304,NA,0.338694808252464,0.741842354657176,NA,0.581974920638737,0.659868075532558,0.107202890365002,1241,191,NA,"no_exp",1.99757810759153e-09
 "aclew",NA,"avg_voc_dur_och",1.57732385012919,0.328088243652795,0.0363815120015201,9.01799363476391,0.619026629010372,0.552665185167556,0.619026629010358,NA,0.550330079163304,NA,0.338694808252464,0.741842354657176,NA,0.581974920638737,0.659868075532558,0.107202890365002,1241,191,NA,"no_exp",1.99757810759153e-09
 "aclew",NA,"avg_voc_dur_chi",1.43664754541997,0.0907886124783394,0.0420413864726481,2.15950567038045,0.476518055245447,0.472791224783953,0.469574451938309,0.00694360330713043,0.485746590338466,0.00718274092037829,0.541510656550113,0.69695522836009,0.0847510526210636,0.735874076558016,0.480612188586834,0.00782096380288083,1236,191,8,"full",0.0340392264029626
 "aclew",NA,"avg_voc_dur_chi",1.43664754541997,0.0907886124783394,0.0420413864726481,2.15950567038045,0.476518055245447,0.472791224783953,0.469574451938309,0.00694360330713043,0.485746590338466,0.00718274092037829,0.541510656550113,0.69695522836009,0.0847510526210636,0.735874076558016,0.480612188586834,0.00782096380288083,1236,191,8,"full",0.0340392264029626
 "aclew",NA,"voc_dur_fem_ph",1.41251202242163,-0.0127051802398437,0.0451728095392448,-0.28125725119678,0.534036822729506,0.533957457848417,0.397161431008609,0.136875391720896,0.425187859217311,0.146534255951145,0.498844727481715,0.652064306044512,0.382797930965078,0.706289407737165,0.534106070973414,0.000148613124996302,1237,191,8,"full",1.3246955366345e-07
 "aclew",NA,"voc_dur_fem_ph",1.41251202242163,-0.0127051802398437,0.0451728095392448,-0.28125725119678,0.534036822729506,0.533957457848417,0.397161431008609,0.136875391720896,0.425187859217311,0.146534255951145,0.498844727481715,0.652064306044512,0.382797930965078,0.706289407737165,0.534106070973414,0.000148613124996302,1237,191,8,"full",1.3246955366345e-07
+"aclew",NA,"simple_CTC_ph",1.42654678027831,0.557327783280278,0.0330812476399664,16.8472419585214,0.57916521955604,0.385746609076581,0.455319225291674,0.123845994264371,0.269240384177356,0.0732328907333216,0.248848965007666,0.518883786774414,0.270615762167176,0.498847637067337,0.719707634270263,0.333961025193682,1233,191,8,"full",7.72444882960434e-06
 "lena",NA,"voc_fem_ph",1.41199701375671,-0.148069406838096,0.0469306552890104,-3.15506795987076,0.525501476514726,0.515811640079551,0.391131447436056,0.134370029078673,0.444258049284887,0.152621241253182,0.538948708455843,0.666526855636656,0.390667686471741,0.734131261053392,0.534250858365751,0.0184392182861992,1230,191,8,"full",6.44023205691597e-07
 "lena",NA,"voc_fem_ph",1.41199701375671,-0.148069406838096,0.0469306552890104,-3.15506795987076,0.525501476514726,0.515811640079551,0.391131447436056,0.134370029078673,0.444258049284887,0.152621241253182,0.538948708455843,0.666526855636656,0.390667686471741,0.734131261053392,0.534250858365751,0.0184392182861992,1230,191,8,"full",6.44023205691597e-07
 "lena",NA,"peak_lena_CVC",1.28770452105026,0.533109738168644,0.0372883867375471,14.2969375940267,0.464883174252291,0.335310298413581,0.30609815879595,0.158785015456346,0.213320870202865,0.110657828866272,0.372924774777203,0.46186672342015,0.332652715104314,0.610675670693702,0.614031669749751,0.27872137133617,1225,191,8,"full",1.31443564234571e-14
 "lena",NA,"peak_lena_CVC",1.28770452105026,0.533109738168644,0.0372883867375471,14.2969375940267,0.464883174252291,0.335310298413581,0.30609815879595,0.158785015456346,0.213320870202865,0.110657828866272,0.372924774777203,0.46186672342015,0.332652715104314,0.610675670693702,0.614031669749751,0.27872137133617,1225,191,8,"full",1.31443564234571e-14
-"lena",NA,"lena_CVC",1.30294516434396,0.470182821952378,0.0376344897083364,12.4934023443987,0.564734490329905,0.442182481147162,0.351171516925993,0.213562973403896,0.263260905562717,0.160100631922334,0.326303207159354,0.513089568752588,0.400125770130261,0.571229557322933,0.659190670448919,0.217008189301757,1214,191,8,"full",1.32551154640784e-11
 "lena",NA,"lp_dur",1.46085830365267,0.658294462602961,0.0365181800764954,18.0264860194023,0.506108249694229,0.309402769511224,0.401088467348818,0.105019782345401,0.273311154634873,0.0715629600672663,0.336549503487254,0.522791693349151,0.26751254188779,0.580128868000252,0.698065630276379,0.388662860765155,1247,191,8,"full",0.000697263500353877
 "lena",NA,"lp_dur",1.46085830365267,0.658294462602961,0.0365181800764954,18.0264860194023,0.506108249694229,0.309402769511224,0.401088467348818,0.105019782345401,0.273311154634873,0.0715629600672663,0.336549503487254,0.522791693349151,0.26751254188779,0.580128868000252,0.698065630276379,0.388662860765155,1247,191,8,"full",0.000697263500353877
 "lena",NA,"lp_n",1.36264779324034,0.641754894227622,0.0370134430905113,17.3384273561986,0.521254651583072,0.328938891001934,0.425639716318834,0.0956149352642469,0.300984708681944,0.0676126600333393,0.338537555828478,0.548620733004089,0.260024345078186,0.581839802547469,0.697886697984696,0.368947806982762,1244,191,8,"full",6.90923411403355e-06
 "lena",NA,"lp_n",1.36264779324034,0.641754894227622,0.0370134430905113,17.3384273561986,0.521254651583072,0.328938891001934,0.425639716318834,0.0956149352642469,0.300984708681944,0.0676126600333393,0.338537555828478,0.548620733004089,0.260024345078186,0.581839802547469,0.697886697984696,0.368947806982762,1244,191,8,"full",6.90923411403355e-06
 "lena",NA,"peak_wc_adu_ph",1.35395428942435,-0.12103313455136,0.0458406148298421,-2.64030347325463,0.297288589217105,0.293209418830801,0.228279094631213,0.0690094945858947,0.239495937409746,0.0724003817463968,0.737240211706023,0.48938322142238,0.269073190315194,0.858626933950958,0.306930666582172,0.0137212477513707,1220,191,8,"full",7.26427538050777e-14
 "lena",NA,"peak_wc_adu_ph",1.35395428942435,-0.12103313455136,0.0458406148298421,-2.64030347325463,0.297288589217105,0.293209418830801,0.228279094631213,0.0690094945858947,0.239495937409746,0.0724003817463968,0.737240211706023,0.48938322142238,0.269073190315194,0.858626933950958,0.306930666582172,0.0137212477513707,1220,191,8,"full",7.26427538050777e-14
@@ -65,6 +63,7 @@
 "lena",NA,"peak_voc_mal_ph",1.39103796697578,-0.0620305861657772,0.0450427375450158,-1.37714955943306,0.373736887758606,0.372323823687572,0.326484045957326,0.0472528418012873,0.332592143147522,0.0481368817836664,0.637979690749811,0.576708022440751,0.219401189111788,0.798736308646233,0.376104729767002,0.00378090607942982,1228,191,8,"full",1.53846663192333e-17
 "lena",NA,"peak_voc_mal_ph",1.39103796697578,-0.0620305861657772,0.0450427375450158,-1.37714955943306,0.373736887758606,0.372323823687572,0.326484045957326,0.0472528418012873,0.332592143147522,0.0481368817836664,0.637979690749811,0.576708022440751,0.219401189111788,0.798736308646233,0.376104729767002,0.00378090607942982,1228,191,8,"full",1.53846663192333e-17
 "lena",NA,"voc_mal_ph",1.26902285836936,-0.0420294067923732,0.0442922239043894,-0.948911639277793,0.443028723433027,0.44223773476507,0.396618922823173,0.0464098006098643,0.39191861010468,0.0458598001849815,0.550370635436569,0.626034032704836,0.214149013971537,0.741869688986259,0.444023146468916,0.00178541170384678,1213,191,8,"full",1.34954608614842e-17
 "lena",NA,"voc_mal_ph",1.26902285836936,-0.0420294067923732,0.0442922239043894,-0.948911639277793,0.443028723433027,0.44223773476507,0.396618922823173,0.0464098006098643,0.39191861010468,0.0458598001849815,0.550370635436569,0.626034032704836,0.214149013971537,0.741869688986259,0.444023146468916,0.00178541170384678,1213,191,8,"full",1.34954608614842e-17
 "lena",NA,"peak_voc_fem_ph",1.46716804925015,-0.150553036002144,0.0470234770273995,-3.20165682164294,0.334287060866377,0.327551021786435,0.255674428459157,0.0786126324072278,0.276857331417044,0.0851257740365337,0.720867976234762,0.52617234003418,0.291763215701592,0.849039443273846,0.347701484871917,0.020150463085482,1233,191,8,"full",2.35975761597958e-12
 "lena",NA,"peak_voc_fem_ph",1.46716804925015,-0.150553036002144,0.0470234770273995,-3.20165682164294,0.334287060866377,0.327551021786435,0.255674428459157,0.0786126324072278,0.276857331417044,0.0851257740365337,0.720867976234762,0.52617234003418,0.291763215701592,0.849039443273846,0.347701484871917,0.020150463085482,1233,191,8,"full",2.35975761597958e-12
-"lena",NA,"lena_CTC",1.40311532814563,0.387791415578942,0.0384536906437075,10.0846345067895,0.605096245167969,0.517819224984212,0.322461769003377,0.282634476164604,0.280958351988516,0.246257151301284,0.344076472986546,0.530055046187201,0.496243036526745,0.586580321001776,0.662055816899486,0.144236591915274,1222,191,8,"full",1.05952155960706e-09
 "lena",NA,"peak_lena_CTC",1.34555573402461,0.414993756226962,0.0396532112758969,10.465577512488,0.497010387384358,0.416061535722033,0.25280695224223,0.244203435142126,0.218815629256953,0.211368903637325,0.43535981751303,0.46777732871202,0.459748739679975,0.659818018481634,0.578933084721922,0.162871548999889,1229,191,8,"full",7.05536450660863e-10
 "lena",NA,"peak_lena_CTC",1.34555573402461,0.414993756226962,0.0396532112758969,10.465577512488,0.497010387384358,0.416061535722033,0.25280695224223,0.244203435142126,0.218815629256953,0.211368903637325,0.43535981751303,0.46777732871202,0.459748739679975,0.659818018481634,0.578933084721922,0.162871548999889,1229,191,8,"full",7.05536450660863e-10
 "lena",NA,"standardScore",1.32339098819807,0.0369236307390135,0.0499325816004787,0.739469692042912,0.320372731791413,0.320016552905101,0.278948089485189,0.0414246423062238,0.28707999643355,0.04263225529696,0.699439792161846,0.535798466247852,0.206475798332299,0.836325171307098,0.32112831695668,0.00111176405157913,1130,186,8,"full",0.0558041643321107
 "lena",NA,"standardScore",1.32339098819807,0.0369236307390135,0.0499325816004787,0.739469692042912,0.320372731791413,0.320016552905101,0.278948089485189,0.0414246423062238,0.28707999643355,0.04263225529696,0.699439792161846,0.535798466247852,0.206475798332299,0.836325171307098,0.32112831695668,0.00111176405157913,1130,186,8,"full",0.0558041643321107
+"lena",NA,"lena_CTC_ph",1.36605878487377,0.409471862151145,0.0388334014206044,10.5443213103111,0.55895641114171,0.467658576790165,0.351084190536585,0.207872220605114,0.287332326860783,0.170125600770854,0.360956386102145,0.536033885925864,0.412462847746138,0.60079645979495,0.63099480933299,0.163336232542825,1218,191,8,"full",5.95081443722613e-11
+"lena",NA,"lena_CVC_ph",1.270413167644,0.524845035287362,0.0361986890070732,14.4990067232769,0.543752773913815,0.391936261548657,0.428258735292795,0.115494038621015,0.287060178279864,0.0774152085751226,0.305820755694453,0.53577997189132,0.278235886569512,0.553010628916347,0.671137618577911,0.279201357029254,1217,191,8,"full",1.74332594140541e-11

File diff suppressed because it is too large
+ 1255 - 1255
data_output/aclew_base_data_set.csv


File diff suppressed because it is too large
+ 1255 - 1255
data_output/aclew_metrics.csv


File diff suppressed because it is too large
+ 1255 - 1255
data_output/aclew_metrics_scaled.csv


+ 69 - 0
data_output/all_rs.csv

@@ -0,0 +1,69 @@
+"","X1","X2","X3","X4","X5","X6","X7","X8","X9","X10","X11","X12","X13","X14","X15","X16","X17","X18","X19","X20","data_set","metric"
+"1",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"
+"2",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"
+"3",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"
+"4",0.612101582025413,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,"aclew","pc_fem_ph"
+"5",0.453895468816131,0.412407372282287,0.512433831300369,0.511873974622775,0.592634100402089,0.47391917352104,0.521497047396641,0.502339897135917,0.520126249863827,0.547309497991841,0.473486921390159,0.510471864543098,0.434204701889369,0.451121011024018,0.515945996981483,0.579683360433923,0.529088826493948,0.511613647409361,0.494454020675439,0.436541952599067,"aclew","pc_mal_ph"
+"6",0.519086082742011,0.569154313347122,0.533682891117097,0.508831093574555,0.595335039076691,0.58003562049415,0.648947186251174,0.574291848723576,0.548825632106,0.589004529725621,0.498902142013653,0.581185791252215,0.574064323777902,0.57031334119447,0.551804092696188,0.590081859535413,0.555797831436618,0.538727391210747,0.538449358391666,0.511443108935004,"aclew","sc_adu_ph"
+"7",0.51995062874752,0.568085421558203,0.532163353275416,0.50895545693479,0.596963031453519,0.582120235442166,0.647471002167913,0.579350351756224,0.545731445140159,0.588359810481756,0.498806213999138,0.582346981795963,0.572016233979889,0.572732787904484,0.551544693764168,0.593614620187932,0.556089134847895,0.536833080599536,0.539653156576613,0.508977330996001,"aclew","pc_adu_ph"
+"8",0.605615876579067,0.618545460689729,0.538651399072411,0.550073425134171,0.588960992728224,0.61685127983049,0.596794575012263,0.490719972563589,0.587764411316614,0.536838233451771,0.586824465022847,0.549664569846853,0.550812138441852,0.58274680029187,0.578317047217438,0.593486845415488,0.633032385125835,0.565887572830481,0.568657662905796,0.519801321589111,"aclew","wc_fem_ph"
+"9",0.422639081158376,0.409995609387467,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.514096181113092,0.580789868119779,0.529737125416281,0.511045856852237,0.492660660373013,0.434700772038992,"aclew","wc_mal_ph"
+"10",0.776329844851422,0.762317655392172,0.773629386583529,0.80731330904492,0.731206223987224,0.670378070668104,0.712161527016787,0.770412314251489,0.753567128474684,0.762713383064226,0.731973977307767,0.753508249756244,0.731202953941381,0.780639483102848,0.763748531544185,0.748497438673731,0.805129836561287,0.705149471214602,0.770480367705703,0.733992810824964,"aclew","can_voc_dur_chi_ph"
+"11",0.621767184114722,0.634605658364187,0.692825057591668,0.63645398810317,0.72163885643533,0.589857132730738,0.658281085267822,0.652289219478783,0.647537718892408,0.663932338728842,0.568432136722615,0.711800494221145,0.648943983754027,0.653799334450546,0.659337711603198,0.705469969349028,0.672474965368139,0.635086274996597,0.639090886506478,0.689460043423256,"aclew","non_can_voc_chi_ph"
+"12",0.605880566400882,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.602522703242067,0.610243090959404,0.436259727960763,"aclew","avg_cry_voc_dur_chi"
+"13",0.537049457883616,0.596773739324188,0.543011654069975,0.582362892425719,0.516567932934974,0.512553516541952,0.516733100973558,0.528549854993053,0.554601085191362,0.463284997450611,0.568776087293533,0.543250750719489,0.511597658204418,0.604439235255224,0.505335046483145,0.474642800944769,0.540290629181634,0.571127659135166,0.522856594543378,0.474344201119857,"aclew","cry_voc_dur_chi_ph"
+"14",0.510725516342005,0.558775343450323,0.478223549799327,0.53377530366097,0.48002450765795,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.510592386506566,0.459310544745964,"aclew","cry_voc_chi_ph"
+"15",0.604819565510691,0.621973933703232,0.675704734556044,0.636292273760913,0.68973507440383,0.603146973672804,0.67341626947081,0.639817700452688,0.63918958475856,0.64945794552826,0.580148858722549,0.691380507410264,0.626026883384086,0.636363294533376,0.669760257894985,0.698986969787719,0.637613477605976,0.620030470618626,0.654009589287115,0.646942730696498,"aclew","non_can_voc_dur_chi_ph"
+"16",0.538798524821472,0.500082027728531,0.551785875458969,0.503240712876565,0.513094865669124,0.576787116209657,0.558317173778955,0.526866710149401,0.557031249847189,0.523875561332612,0.538254724986203,0.571525841079245,0.566967165121223,0.478738853411478,0.458980985092495,0.580658728723593,0.576578295452479,0.615110650373415,0.565038167350548,0.478800184918283,"aclew","avg_non_can_voc_dur_chi"
+"17",0.465291632371695,0.536160464205058,0.40292859355782,0.521774482081191,0.397405860516335,0.481425593640985,0.503985713205109,0.411959654758617,0.426225705755156,0.480293869525321,0.477832797936293,0.409158246328431,0.403245765766393,0.490631410119349,0.53868515186307,0.512274032640272,0.530966114894488,0.518820153189833,0.437108619568531,0.36402312668394,"aclew","lp_n"
+"18",0.448729999595054,0.471972559297468,0.453237504370271,0.560383304976782,0.485241347788393,0.422328651051034,0.487204239923691,0.444060162507449,0.420185755373799,0.50502300040171,0.473107702809308,0.41991245225398,0.410315739698773,0.520833384000972,0.516806327928826,0.532917333199025,0.517929227055006,0.541310155751209,0.38491444908078,0.377088423972374,"aclew","lp_dur"
+"19",0.76364071209065,0.764088798553397,0.705123509039246,0.773229824468831,0.6736735425919,0.762336113838847,0.652349693260087,0.771745180406618,0.719328661602541,0.70740190926681,0.733502194974017,0.73273532045883,0.736740847850496,0.731450124257904,0.760200318401558,0.751329727656444,0.747361781687061,0.665839563423871,0.726412676351454,0.736094835523757,"aclew","cp_n"
+"20",0.720578597004699,0.71898788323355,0.653631045997614,0.723505272436522,0.629428734830478,0.738437824784773,0.62713089686823,0.70394266472892,0.656885947990794,0.655098176259349,0.699178023852168,0.669505163536581,0.698510393187217,0.704875463889374,0.703843261595945,0.706063117205952,0.705593786409236,0.648606912874211,0.675373338966844,0.669072854819628,"aclew","cp_dur"
+"21",0.624891235600395,0.560785946582761,0.524651163445485,0.63494566535634,0.517129020073855,0.523666664062182,0.647101288158205,0.586194620871482,0.643552310827299,0.65590147084155,0.604914090294954,0.649630440960945,0.5972047304685,0.654868060417701,0.535978490117409,0.577111710214785,0.621798586737808,0.638580413851963,0.582505489738037,0.533987881682835,"aclew","avg_can_voc_dur_chi"
+"22",0.815568063272495,0.805459505293446,0.853550032509681,0.813069836761214,0.767985633544625,0.761304170639183,0.762571137914819,0.802329182297835,0.808060976544563,0.802342492863332,0.771130745356674,0.815447705566579,0.779142018686698,0.806977696867667,0.808095122730841,0.807796002621576,0.832297872016938,0.767529886442811,0.819154903719279,0.789411685260068,"aclew","can_voc_chi_ph"
+"23",0.615767914984622,0.632523861245143,0.65993627254879,0.621370437052487,0.664720580844794,0.507925314756752,0.611127401071665,0.652484625138452,0.599253133584702,0.620533065434235,0.535939584241867,0.66980682029105,0.652449920986237,0.688435754754551,0.577394823562626,0.65316091499019,0.643632815469961,0.614956383752459,0.582881224416441,0.60999651903111,"aclew","voc_chi"
+"24",0.509705084696262,0.64644608411566,0.652356954781486,0.567004744678091,0.601767721482991,0.513381336683878,0.552965283098975,0.614592413044375,0.570598971152563,0.599267822862678,0.586362793497837,0.646863705071988,0.632287139786668,0.571074576537507,0.633372671345156,0.568269722022662,0.620818842514788,0.589585122364277,0.625776279461507,0.671739466947045,"aclew","peak_voc_chi"
+"25",0.706175264700129,0.67642278122811,0.650235335542526,0.63289114125847,0.698423643342167,0.665391588639897,0.690560831062713,0.706674186835948,0.66739813139353,0.679868269324616,0.673890400883986,0.718101177283261,0.672604754785653,0.706579846690095,0.655273202256679,0.713129054331586,0.698329332805901,0.640938109077421,0.692695962972803,0.661563313833428,"aclew","voc_fem_ph"
+"26",0.368286967172532,0.385924560544755,0.397877945541796,0.271993481829834,0.463467862276035,0.326331683661567,0.30856617894889,0.532146804341895,0.385636339427868,0.392915186158719,0.374988726818699,0.363838272820678,0.397204557847419,0.432641018643323,0.289689393306845,0.347644288797615,0.37512872089502,0.258062440879496,0.344182443561966,0.368282234799181,"aclew","peak_voc_fem_ph"
+"27",0.616031312165352,0.703420710919501,0.679859144110372,0.600042644398157,0.655110255935954,0.56185914088316,0.613779732860626,0.66893619329032,0.588925643884016,0.654720667228016,0.637983330743261,0.667715734319248,0.618656423381066,0.6574256828032,0.670309190108829,0.633315045754006,0.680241044790779,0.58936288865026,0.662435540920276,0.669323298739891,"aclew","peak_simple_CTC"
+"28",0.254626944903326,0.37738503293213,0.358232330837139,0.253076181277259,0.401727817180259,0.409008314756607,0.401004553363269,0.37328885351539,0.357317005036179,0.498959536317855,0.312637024197299,0.429834320619208,0.40218153414165,0.315850267819196,0.355500899775946,0.404750215996279,0.279884157529219,0.329667447491777,0.28801348419087,0.320820123083396,"aclew","peak_voc_mal_ph"
+"29",0.79307731314616,0.780474988230087,0.736967831313103,0.774948582308733,0.809721789260532,0.777066035706324,0.744249497365171,0.792131138180702,0.755047823361635,0.753653409524792,0.743237844222134,0.812676974313951,0.777521845728702,0.774474730389284,0.756744397684686,0.732055074471672,0.789229100582446,0.764910997238315,0.774292978328385,0.742019748640869,"aclew","voc_och_ph"
+"30",0.670776183183699,0.719846859111819,0.612354210034068,0.619794303082141,0.704366579107451,0.649355023198546,0.618233278192651,0.698673928408857,0.681952519170603,0.573115627313923,0.625629369728263,0.688174794232266,0.602803435332205,0.687852742372292,0.656172419406978,0.675345882733445,0.694113396927643,0.683967390501495,0.675921596043818,0.656707514378964,"aclew","peak_voc_och_ph"
+"31",0.663558793043939,0.688335572292661,0.718383890018228,0.683190083369334,0.734751951893677,0.616098888781895,0.689462694148258,0.704826076987046,0.679089068877865,0.708190937085788,0.635990468089049,0.749411595857203,0.689072307223663,0.711060206495477,0.688898210244804,0.699559532547737,0.701617481390255,0.657893100145003,0.676814057691932,0.715651154692895,"aclew","voc_chi_ph"
+"32",0.509705084696262,0.64644608411566,0.652356954781486,0.567004744678091,0.601767721482991,0.513381336683878,0.552965283098975,0.614592413044375,0.570598971152563,0.599267822862678,0.586362793497837,0.646863705071988,0.632287139786668,0.571074576537507,0.633372671345156,0.568269722022662,0.620818842514788,0.589585122364277,0.625776279461507,0.671739466947045,"aclew","peak_voc_chi_ph"
+"33",0.456798399927522,0.457878410815907,0.519246778287842,0.469861959180112,0.653792607028568,0.566152540372533,0.579095649315059,0.634125614796008,0.600340066186205,0.661616739432527,0.524825889839146,0.543047435328301,0.550992248338118,0.538796686989278,0.541562021079575,0.566303911402961,0.531959626399694,0.516953773264406,0.537714245759343,0.565130417801082,"aclew","voc_mal_ph"
+"34",0.412099697932018,0.41164257065729,0.479641712036116,0.444799987968187,0.6184600175909,0.510890602078329,0.56607008434508,0.537543828260123,0.551754768593841,0.634655641744801,0.5678309823274,0.513898391867727,0.503910463081003,0.540764534321028,0.506271773521366,0.578459503990369,0.509669430850683,0.524484432585359,0.548300147372986,0.513141423650995,"aclew","voc_dur_mal_ph"
+"35",0.739078902186085,0.775211074029269,0.724944716035553,0.768978165635619,0.777658099034006,0.738828663574653,0.702553986526181,0.772451204023906,0.742122896540218,0.731488474395282,0.723195396373732,0.78248304448843,0.752659560166616,0.733263195260178,0.726865600244635,0.664518249620336,0.7554697905541,0.751973871055236,0.748100787037682,0.730991306204573,"aclew","voc_dur_och_ph"
+"36",0.706707332769253,0.708745500243963,0.736918148151124,0.752688965068398,0.728484246403939,0.626360848497273,0.718275291539139,0.694203610335758,0.703810792057042,0.686733842512463,0.669158590456941,0.736769923958224,0.676539110540014,0.735097108855217,0.710781227728438,0.666640252187855,0.711954448755433,0.687867829733402,0.693002646194955,0.692676331243829,"aclew","voc_dur_chi_ph"
+"37",0.440122840513334,0.456952390841685,0.432335663743403,0.541863564526901,0.609346472668207,0.480414588748178,0.521706656599047,0.574240246186688,0.503906001261885,0.419597684789231,0.489809401289438,0.543077736496381,0.502097310529312,0.528905851547599,0.429127533711739,0.465459083030913,0.471876129428944,0.349329475757884,0.437058860055576,0.498492624743001,"aclew","avg_voc_dur_fem"
+"38",0.470822435854684,0.444124569754123,0.470513614123499,0.47306858630739,0.502944762299035,0.474514981027506,0.5188859088533,0.494309389044907,0.645400795022864,0.46971937268549,0.537206918208407,0.512653656173001,0.397020419405271,0.552273578878179,0.516001088399303,0.457804384336194,0.479581204411402,0.532271886095274,0.503480830640904,0.49574517692668,"aclew","avg_voc_dur_mal"
+"39",0.658947967388154,0.70415466881598,0.636798527108917,0.663209801428839,0.707034188429744,0.656159814503536,0.647626748786253,0.705251281714332,0.685586408417439,0.616459840717674,0.637852788090831,0.657794211184732,0.65763405074612,0.618164891469975,0.623889650322506,0.623512817740204,0.660229950592527,0.697790534781385,0.699195082812112,0.693024196237678,"aclew","avg_voc_dur_och"
+"40",0.653575962364304,0.626072665604683,0.530378149335105,0.664839988949207,0.568123427990754,0.585026185260148,0.664271769352599,0.614962622271652,0.653345004475812,0.608766936685168,0.636316207247498,0.6745105192045,0.62257920677784,0.594878126141789,0.609257782186337,0.668734329815782,0.644147542712362,0.686650662214933,0.569969275773014,0.577388249501231,"aclew","avg_voc_dur_chi"
+"41",0.609284005093348,0.60056000968558,0.508583658434065,0.555940663656364,0.631000968329319,0.598798332311116,0.612243391633638,0.59501386546207,0.586663705282806,0.56212342247169,0.591400060958242,0.588684249654415,0.585060855444436,0.633005080892077,0.55259354759516,0.568805235732638,0.595342829461703,0.52352221890042,0.579636408132324,0.547782212595295,"aclew","voc_dur_fem_ph"
+"42",0.767556122318934,0.749274426090441,0.749711862363772,0.752563930884069,0.78908216504436,0.725157628475316,0.770939026894618,0.794043352616229,0.750670235321324,0.751042993679118,0.750891295253276,0.79963776485252,0.764053382264747,0.784412038440407,0.745911217966578,0.745639180835196,0.76226990172277,0.725090971030278,0.761725724291896,0.767890406987292,"aclew","simple_CTC_ph"
+"43",0.577023856622849,0.544631119207252,0.498760160652994,0.579404038504559,0.585592718633337,0.577860011022351,0.573453835148534,0.619495370553328,0.574648213969999,0.570482938368478,0.546598841749175,0.577152805526624,0.619823478758052,0.601106972797835,0.517498227378343,0.567176278230629,0.609237975860836,0.491011246700207,0.543106110839461,0.50572333080369,"lena","voc_fem_ph"
+"44",0.575023664616254,0.696758086752186,0.645189786079153,0.641425054321643,0.629453963277946,0.592555542265142,0.644511920607655,0.658923176694353,0.580677349116494,0.623689877019895,0.640882475134395,0.661099093221465,0.593221941963173,0.594665178059069,0.614106889293579,0.593167342291599,0.725763384050695,0.631959061798077,0.639070822456476,0.674279299217425,"lena","peak_lena_CVC"
+"45",0.777161222937707,0.763658500781102,0.773891586458685,0.800911835303582,0.800250345170872,0.783075481663763,0.754179278523275,0.768031417382833,0.770998670324637,0.807818200876252,0.786758062920237,0.7636373819806,0.753697556930721,0.781068039805793,0.770126140655244,0.766969080995379,0.755641750312263,0.75010284381333,0.754536701655649,0.741592130919926,"lena","lp_dur"
+"46",0.79077637531595,0.775892305953215,0.778540101181717,0.818951135274011,0.77968598559923,0.781561820944014,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,"lena","lp_n"
+"47",0.278724222826177,0.292211189103061,0.333238310131761,0.396664032410664,0.312576461586514,0.339482824564949,0.327374112483269,0.414285266003601,0.446278916520041,0.367018984231649,0.304567360564912,0.333915974311184,0.456092976586313,0.358837710187657,0.232645575498345,0.229781447430251,0.377433677179336,0.230422614882585,0.296964861401757,0.338840436867077,"lena","peak_wc_adu_ph"
+"48",0.529948346609509,0.446342782355496,0.504698931066006,0.579748728260576,0.543917310822166,0.536977550040328,0.568500549168598,0.604358829971736,0.484426728586767,0.596126505311184,0.524345438243237,0.598645377869968,0.581628605283755,0.557335285172798,0.38994557880904,0.512388644824795,0.568364009261304,0.384345606485758,0.507037180560286,0.472424235433623,"lena","wc_adu_ph"
+"49",0.409669829717083,0.495416764257919,0.39564242506268,0.475642645551151,0.387836057980293,0.45409170760701,0.475241962089335,0.481416879719821,0.559984781669361,0.622679378841084,0.551463296134509,0.535690435623764,0.390953940966402,0.520015855928099,0.488760305530557,0.438295571175104,0.422338107860466,0.426711854955899,0.41075875682501,0.548551514209281,"lena","wc_mal_ph"
+"50",0.541803444099567,0.548912292756428,0.455231512738111,0.561493794376427,0.517597047174637,0.557521087827731,0.568002403399166,0.582219177092727,0.556043275340298,0.588996791320472,0.561771752580744,0.538754181002462,0.617474902929307,0.579678230741059,0.435322749871408,0.536512399950102,0.56409391986045,0.438012760139649,0.525041286713149,0.485945062408933,"lena","wc_fem_ph"
+"51",0.528029270335922,0.490318137368078,0.56732840701042,0.646904954705906,0.618900487983524,0.594355026935827,0.561551332914422,0.666663187142741,0.595218819296988,0.531926101751922,0.584184002071092,0.596995166798318,0.373124786449771,0.548078767159135,0.550058838059385,0.492412585478013,0.538558770881597,0.634829128732732,0.557235591092447,0.567757921903953,"lena","avg_voc_dur_chi"
+"52",0.568028671051045,0.445540488789363,0.506150551927157,0.51325877375364,0.417301682091102,0.583420255935482,0.495026979607544,0.566071397799542,0.410859116081604,0.480390679299775,0.536658243255659,0.518688600189684,0.511434812695369,0.475065198696925,0.527604948629044,0.528235304228402,0.300941278687904,0.505685847489519,0.533084164066375,0.546880286295768,"lena","avg_voc_dur_och"
+"53",0.269226121531571,0.416703987350695,0.406587706041473,0.430968872644221,0.432670912800272,0.374737837274107,0.400301374120868,0.381436989215389,0.418683194795644,0.366068851283697,0.346816319817315,0.461852924778205,0.350777755879061,0.41913303372982,0.410665039051536,0.411070855494646,0.370332653980733,0.442289169632383,0.361236317366322,0.506011947193841,"lena","avg_voc_dur_mal"
+"54",0.364900069260369,0.479264498456893,0.398319461934832,0.416228797503012,0.571532062107263,0.401837408734622,0.441807201825882,0.400458521778958,0.447276962986031,0.498825040089607,0.458625150944248,0.432328467824555,0.476695084204696,0.503388313690748,0.354405910615426,0.474238605318202,0.459705328778063,0.355763731449345,0.361516846865296,0.393206280701846,"lena","avg_voc_dur_fem"
+"55",0.622199541279469,0.616934907628417,0.601918166973835,0.668288822566744,0.618052795570861,0.533003299791367,0.609294042075418,0.612406516857663,0.602522842653481,0.583914917947506,0.624999686236765,0.652101227976342,0.527175048535465,0.670863944066618,0.585884944211583,0.613304727759076,0.643922141339969,0.578853715849266,0.588505687758261,0.613489683402696,"lena","voc_dur_chi_ph"
+"56",0.70816980177094,0.665030122170378,0.73953518776717,0.737379028893827,0.722312118952761,0.664679195864159,0.695303728847736,0.699074038686938,0.640825349381162,0.691493325766367,0.608412025982768,0.733923919811333,0.689486277017726,0.678049190355402,0.670224146291901,0.642662826383981,0.712466729172385,0.689500557429511,0.701436018774193,0.660699624490525,"lena","voc_dur_och_ph"
+"57",0.410247586816077,0.481438182087989,0.499339697603498,0.521765499959078,0.449726601647751,0.415491664354224,0.443743534234547,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,"lena","voc_dur_mal_ph"
+"58",0.524702931585103,0.526804530556653,0.44776505063486,0.542107711185311,0.526967957568277,0.56143906129784,0.551012499575954,0.578910522472196,0.551261193891636,0.587169761657119,0.529973693270416,0.515136489450672,0.61366977467668,0.532829935726937,0.452673323274802,0.520855502606575,0.555989763864913,0.435403475897326,0.522096847563674,0.487574331901232,"lena","voc_dur_fem_ph"
+"59",0.455612270898647,0.566611625504985,0.525770211275486,0.457873720479021,0.560021934427905,0.417797272219518,0.547179260569881,0.591096135864837,0.430339244539447,0.483560626524835,0.512844874573083,0.619521882220236,0.531273191646718,0.510365567806462,0.479989882994034,0.444448054105518,0.557318576502302,0.456022297100602,0.515027796846623,0.580505323476756,"lena","peak_voc_chi_ph"
+"60",0.574927663350819,0.585985512441094,0.610773630529681,0.668344551647968,0.602125495152683,0.530440073033008,0.631801891586782,0.622291783428742,0.598128488302872,0.600504177805796,0.594325656154649,0.678383598635582,0.556337765564854,0.638573434729219,0.593594951719832,0.597744632232196,0.620694646079525,0.543883135348932,0.607000557981912,0.615504085360421,"lena","voc_chi_ph"
+"61",0.579181414717686,0.532289951406167,0.534137508625062,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.506627847158235,0.519321317039891,0.578791571063874,0.510191165612951,"lena","peak_voc_och_ph"
+"62",0.693923028863091,0.647380288932446,0.74520424212002,0.726716585103133,0.745906184957369,0.642159171679734,0.706006780001375,0.699623325979615,0.666369795644454,0.686804217289173,0.587301633730351,0.750446729445452,0.708956892013684,0.664542954160193,0.654711483606738,0.630378484387337,0.714881219608721,0.704547057507377,0.715080017577124,0.633218264146044,"lena","voc_och_ph"
+"63",0.286484562164517,0.332074549164244,0.389989344642855,0.365276501608557,0.409887886333878,0.298290365236591,0.353706242169203,0.404723544833092,0.5155604556104,0.501068005820689,0.325310197418498,0.472635885764813,0.425138046567129,0.366001251141388,0.384037229722257,0.414133661984493,0.388517296927434,0.372985817271637,0.337488128410496,0.395800058117127,"lena","peak_voc_mal_ph"
+"64",0.335229515634742,0.487034309928276,0.38757652290954,0.424489940988794,0.417957387666436,0.436160598384061,0.404142274859563,0.487991415187703,0.52571301497637,0.592933022039014,0.496478303919758,0.539576882267025,0.350186804051403,0.519252297390048,0.442797901768391,0.466293418302344,0.343304052337942,0.326915201596124,0.38712436195036,0.533075131858983,"lena","voc_mal_ph"
+"65",0.342992005830307,0.291684165433152,0.273424725276735,0.26770372239029,0.357344802199788,0.305670113844583,0.337084544463392,0.416165673082298,0.37586799053497,0.319303957240314,0.348238599072395,0.3214757017161,0.408797540026915,0.352482443973355,0.231927735737371,0.255166839355655,0.401433771954828,0.228845848404545,0.315723437627807,0.311058487615618,"lena","peak_voc_fem_ph"
+"66",0.605702513602109,0.594960093725274,0.599230236546151,0.595049762046316,0.629742492369314,0.595853104408573,0.610603751606132,0.662293288971053,0.556855282975889,0.588735662785858,0.647560057000835,0.565504952204795,0.615952043915052,0.576532536018628,0.574290308509147,0.596380510375799,0.632187474854145,0.500564341416473,0.652903522616657,0.609605032571637,"lena","peak_lena_CTC"
+"67",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"
+"68",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"

File diff suppressed because it is too large
+ 1255 - 0
data_output/dat_sib_ana.csv


File diff suppressed because it is too large
+ 1254 - 1254
data_output/lena_base_data_set.csv


File diff suppressed because it is too large
+ 1254 - 1254
data_output/lena_metrics.csv


File diff suppressed because it is too large
+ 1254 - 1254
data_output/lena_metrics_scaled.csv