Absolute pitch and sound-colour synaesthesia provide for unique learning opportunities

Lab Meeting, October 2019

Beat Meier, Andrew Ellis, Solange Glasser

So far

Musicians vs controls

Absolute pitch, relative pitch, controls

Synaesthetes, absolute pitch, relative pitch, controls

Ordinal data

Ordinal regression

Unequal Variance (logistic) SDT Model

\[ P(Y \leq k | X) = F\left( \frac{ c_k - dX} { \sigma_X } \right)\]

for \(k=1\) to \(K-1\), where

Model specification

We wish to predict subjects’ responses from

formula <- bf(response ~ 1 + test * group4 * oldnew + 
                  (1 + test * oldnew | gr(subject, by = group4)) + 
                  (1 + test * oldnew | item)) +
  lf(disc ~ 0 + group4 * oldnew + 
       (0 + oldnew | gr(subject, by = group4)), cmc = FALSE)
priors <- prior(normal(0, 3), class = Intercept) +
  prior(normal(0, 1), class = b) +
  prior(normal(0, 1), class = b, dpar = "disc") +
  prior(student_t(3, 0, 1), class = sd, group = subject) +
  prior(student_t(3, 0, 1), class = sd, group = item) +
  prior(lkj(2), class = cor, group = subject) +
  prior(lkj(2), class = cor, group = item)
fit_1 <- brm(formula = formula,
            family = cumulative(),
            data = data,
            prior = priors,
            init_r = 0.05,
            control = list(adapt_delta = 0.9),
            cores = parallel::detectCores())

Problematic data points

## Pareto k diagnostic values:
##                          Count Pct.    Min. n_eff
## (-Inf, 0.5]   (good)     3162  99.8%   656       
##  (0.5, 0.7]   (ok)          6   0.2%   651       
##    (0.7, 1]   (bad)         0   0.0%   <NA>      
##    (1, Inf)   (very bad)    0   0.0%   <NA>      
## 
## All Pareto k estimates are ok (k < 0.7).
pareto_k_ids(loo_fit_1)
## [1]  337  569 1143 1604 1612 2347
plot(loo_fit_1)

data[pareto_k_ids(loo_fit_1), ] %>% knitr::kable()
subject group2 group3 group4 syn test time oldnew triplet item response confidence
16 musician abspitch abspitch nosyn nurfarbe2 1 old 1 4 1 1
4 musician abspitch syn syn beides 3 new -1 13 4 4
66 musician relpitch relpitch nosyn beides 3 old 1 6 1 1
8 musician abspitch syn syn nurton 2 old 1 7 3 3
8 musician abspitch syn syn nurton 2 old 1 2 5 5
10109 control control control nosyn beides 3 old 1 3 5 5

Posterior distributions of conditional means

Posterior distributions of conditional means

Posterior distributions of conditional response probabilities

Posterior predictive checks

Score (old - new)

Old / New responses

Todo list

Questions