Daten & Packages laden

Laden Sie die folgenden Packages und Data-Frames:

library(tidyverse)
library(broom)
library(gridExtra)
library(lmerTest)
library(emmeans)
library(MuMIn)
library(afex)
sigmoid = function(x, k = 0, m = 1) {
  exp(m * x + k) / (1 + exp(m * x + k))
}

urla = "https://www.phonetik.uni-muenchen.de/studium_lehre/"
urlb = "lehrmaterialien/R_speech_processing/Rdf"
url = paste0(urla, urlb)
dk = read.table(file.path(url, "dk.df.txt"), 
                stringsAsFactors = T)
hoch = read.table(file.path(url, "hoch.df.txt"), 
                  stringsAsFactors = T)
kj = read.table(file.path(url, "kj2.txt"), 
                stringsAsFactors = T)
kj = kj %>%
  mutate(Age =factor(Age, levels=c("young", "mid", "old")), 
         Social = factor(Social, levels=c("WC", "LMC", "UMC")))


ctm = read.table(file.path(url, "ctm.df.txt"))

gp = read.table(file.path(url, "gpachild.df.txt"),
                stringsAsFactors = T)
# Bild: Unterschiede im Vokal; Region A > B; möglicherweise eine Interaktion
dk %>%
  ggplot() +
  aes(y = rt, x = Vokal, fill = Region) +
  geom_boxplot()

# Vokal within, Region between
dk %>%
  mutate(Fac = interaction(Region, Vokal)) %>%
  select(Vpn, Fac) %>%
  table()
##     Fac
## Vpn  A.a B.a A.i B.i A.u B.u
##   S1   1   0   1   0   1   0
##   S2   1   0   1   0   1   0
##   S3   1   0   1   0   1   0
##   S4   0   1   0   1   0   1
##   S5   0   1   0   1   0   1
##   S6   0   1   0   1   0   1
# Nur Vokal ist sig.
dk %>%
  aov_4(rt ~ Region * Vokal + (Vokal|Vpn), .) 
## Contrasts set to contr.sum for the following variables: Region
## Anova Table (Type 3 tests)
## 
## Response: rt
##         Effect         df    MSE         F  ges p.value
## 1       Region       1, 4 207.59      0.75 .153    .435
## 2        Vokal 1.83, 7.34   4.80 89.82 *** .477   <.001
## 3 Region:Vokal 1.83, 7.34   4.80      1.91 .019    .215
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '+' 0.1 ' ' 1
## 
## Sphericity correction method: GG
# Hier testen welche Vokalpaare sich voneinander unterscheiden. 
# Aber vielleicht dann doch auch Region testen, 
# da das Bild zumindest eine mögliche Interaktion zeigt
dk %>%
  aov_4(rt ~ Region * Vokal + (Vokal|Vpn), .) %>%
  emmeans(., ~ Region * Vokal) %>%
  pairs(., simple="each", combine=T)
## Contrasts set to contr.sum for the following variables: Region
##  Vokal Region contrast estimate   SE df t.ratio p.value
##  a     .      A - B        3.78 7.10  4   0.532  1.0000
##  i     .      A - B        5.44 7.69  4   0.708  1.0000
##  u     .      A - B        8.44 5.90  4   1.431  1.0000
##  .     A      a - i       15.00 1.44  4  10.415  0.0043
##  .     A      a - u        8.67 1.88  4   4.608  0.0897
##  .     A      i - u       -6.33 1.78  4  -3.549  0.2144
##  .     B      a - i       16.67 1.44  4  11.573  0.0029
##  .     B      a - u       13.33 1.88  4   7.090  0.0188
##  .     B      i - u       -3.33 1.78  4  -1.868  1.0000
## 
## P value adjustment: bonferroni method for 9 tests

Vokal (\(F[1.83, 7.34] = 89.8, p < 0.001\)) beeinflusste signifikant die Reaktionszeit. Post-hoc Tests zeigten signifikante Unterschiede zwischen /a, i/ in beiden Regionen (\(p < 0.001\)), einen signifikanten /a, u/ Unterschied in Region B (\(p < 0.05\)) aber nicht in Region A; und keine signifikanten /i, u/ Unterschiede.

# Proportionen berechnen: es sieht nicht sehr
# sigmoidal aus, aber eventuell weil unter ca. 320 Hz
# alles im /i/ Bereich liegt
hoch %>%
  group_by(F1, V) %>%
  summarise(n = n()) %>%
  mutate(p = n/sum(n)) %>%
  filter(V == levels(V)[2]) %>%
  ggplot() +
  aes(y = p, x = F1) +
  geom_point()
## `summarise()` has grouped output by 'F1'. You can override using the `.groups`
## argument.

# Koeffiziente berechnen
km = hoch %>%
  glm(V ~ F1, ., family=binomial) %>%
  coef()
km
## (Intercept)          F1 
##  7.53178313 -0.02072417
# Sigmoid
hoch %>%
  group_by(F1, V) %>%
  summarise(n = n()) %>%
  mutate(p = n/sum(n)) %>%
  filter(V == levels(V)[2]) %>%
  ggplot() +
  aes(y = p, x = F1) +
  ylab("Proportion /i/-Urteile") +
  geom_point() +
  stat_function(fun = sigmoid, args=list(k = km[1], m = km[2]))
## `summarise()` has grouped output by 'F1'. You can override using the `.groups`
## argument.

# Umkipppunkt
-km[1]/km[2]
## (Intercept) 
##    363.4299
# Statistik
hoch %>%
  glm(V ~ F1, ., family=binomial) %>%
  anova(test='Chisq')
## Analysis of Deviance Table
## 
## Model: binomial, link: logit
## 
## Response: V
## 
## Terms added sequentially (first to last)
## 
## 
##      Df Deviance Resid. Df Resid. Dev Pr(>Chi)  
## NULL                    59     47.121           
## F1    1   4.6884        58     42.432  0.03037 *
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Die Wahl zwischen /i/ und /e/ wurde signifikant von F1 beinflusst (\(X^2[1] = 4.7, p < 0.05\)). Der Umkipppunkt zwischen /i, e/ liegt bei 363 Hz.

kj %>%
  ggplot() +
  aes(x = Social, fill = Fric) +
  facet_wrap(~Gender) +
  geom_bar(position="fill")

Die Abbildung zeigt einen Einfluss sozialer Klasse auf die /s, S/ Auswahl: mehr /S/ in WC als in LMC als in UMC. Das Bild zeigt eventuell eine Interaktion zwischen Geschlecht und sozialer Klasse. Der Grund: die Proportionen der /S/-Urteile sind für Frauen in den 3 Klassen anders verteilt als in Männern (z.B. ist der Unterschied in /S/-Proportionen zwischen WC, LMC und UMC wesentlich größer in Frauen als in Männern).

# Das Bild zeigt eindeutig eine solche Abhängigeit: die Proportion 
# von /S/-Urteilen ist young > mid > old
kj %>%
  ggplot() +
  aes(x = Age, fill = Fric) +
  geom_bar(position="fill")

# Alter ist signifikant
kj %>%
  glm(Fric ~ Age, binomial, .) %>%
  anova(test='Chisq')
## Analysis of Deviance Table
## 
## Model: binomial, link: logit
## 
## Response: Fric
## 
## Terms added sequentially (first to last)
## 
## 
##      Df Deviance Resid. Df Resid. Dev Pr(>Chi)    
## NULL                   239     263.13             
## Age   2   17.371       237     245.76 0.000169 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
# Noch ein post-hoc Test durchführen, um festzustellen, welche
# Alterspaare sich signifikant unterscheiden.
kj %>%
  glm(Fric ~ Age, binomial, .) %>%
  emmeans(., ~Age) %>%
  pairs(., simple="each", combine=T)
##  contrast    estimate    SE  df z.ratio p.value
##  young - mid    0.233 0.342 Inf   0.682  1.0000
##  young - old    1.670 0.461 Inf   3.623  0.0009
##  mid - old      1.437 0.466 Inf   3.081  0.0062
## 
## Results are given on the log odds ratio (not the response) scale. 
## P value adjustment: bonferroni method for 3 tests

Die /s, S/ Auswahl wurde signifikant vom Alter beeinflusst (\(X^2[2] = 17.4, p < 0.001\)). Post-hoc Tests zeigten signifikante Unterschiede zwischen jung und alt (\(p < 0.001\)) und zwischen mittelalt und alt (\(p < 0.01\)) aber nicht zwischen jung und mittelalt.

summary(ctm)
##        V1             V2      
##  Min.   :1400   Min.   :1865  
##  1st Qu.:1603   1st Qu.:1985  
##  Median :1773   Median :2362  
##  Mean   :1774   Mean   :2267  
##  3rd Qu.:1913   3rd Qu.:2434  
##  Max.   :2257   Max.   :2829
# Das Bild zeigt eine solche lineare Beziehung: je höher V2 umso höher V1
ctm %>%
  ggplot() +
  aes(y = V1, x = V2) +
  geom_point() + 
  geom_smooth(method = "lm", se = F, color = "blue") 
## `geom_smooth()` using formula = 'y ~ x'

# Die Beziehung ist signifikant.
ctm %>%
  lm(V1 ~ V2, .) %>%
  summary() 
## 
## Call:
## lm(formula = V1 ~ V2, data = .)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -406.92  -84.76   -1.41   86.23  366.06 
## 
## Coefficients:
##             Estimate Std. Error t value Pr(>|t|)    
## (Intercept) 482.0388   238.7891   2.019   0.0508 .  
## V2            0.5701     0.1047   5.444 3.56e-06 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 161.4 on 37 degrees of freedom
## Multiple R-squared:  0.4447, Adjusted R-squared:  0.4297 
## F-statistic: 29.64 on 1 and 37 DF,  p-value: 3.556e-06
ctm %>%
  lm(V1 ~ V2, .) %>%
  predict(., data.frame(V2 = 2600))
##        1 
## 1964.326

Konsistent mit der Abbildung gibt es ein signifikantes, lineares Verhältnis zwischen den beiden Variablen (\(R^2 = 0.45, F[1, 37] = 29.64, p < 0.001\)). Der vorhergesagte V1-Wert ist 1964 Hz für einen V2-Wert von 2600 Hz.

davor = c(30, 0, 60, 70, 40, 30, 20, 10, 40)
danach = c(50, 10, 50, 70, 100, 90, 70, 110, 80)

# Am einfachsten: 
# Der Box liegt unter der 0 (Null) Linie. 
boxplot(davor-danach)

# Der Einfluss der Wahrnehmung auf VOT ist signifikant.
t.test(davor-danach)
## 
##  One Sample t-test
## 
## data:  davor - danach
## t = -3.1429, df = 8, p-value = 0.01375
## alternative hypothesis: true mean is not equal to 0
## 95 percent confidence interval:
##  -63.570048  -9.763285
## sample estimates:
## mean of x 
## -36.66667
# Alternativ-1 (Bild):
data.frame(d = davor - danach) %>%
  ggplot() +
  aes(y = d) + 
  geom_boxplot()

# Alternativ-2 (Bild):
vot = c(davor, danach)
posn = factor(c(rep("davor", 9), rep("danach", 9)))
vpn = factor(rep(paste0("S", 1:9), 2))
data.frame(vot, posn, vpn) %>%
  ggplot() +
  aes(y = vot, x = posn, col = vpn, group = vpn) +
  geom_point() +
  geom_line()

# Alternativ-1 (Test):
data.frame(vot, posn, vpn) %>%
  aov_4(vot ~ posn + (posn|vpn), .) %>%
  anova()
## Anova Table (Type 3 tests)
## 
## Response: vot
##      num Df den Df   MSE      F    ges  Pr(>F)  
## posn      1      8 612.5 9.8776 0.3467 0.01375 *
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Die Wahrnehmung hat einen signifikanten (\(t[8] = 3.1, p < 0.05\)) Einfluss auf VOT.

summary(gp)
##  year        student         sex            F1       
##  D1:400   S1     :   6   female:630   Min.   :1.700  
##  D2:400   S10    :   6   male  :570   1st Qu.:2.600  
##  D3:400   S100   :   6                Median :2.800  
##           S101   :   6                Mean   :2.865  
##           S102   :   6                3rd Qu.:3.100  
##           S103   :   6                Max.   :4.000  
##           (Other):1164
head(gp)
##   year student    sex  F1
## 1   D1      S1 female 2.3
## 2   D1      S1 female 2.1
## 3   D2      S1 female 3.0
## 4   D2      S1 female 3.0
## 5   D3      S1 female 3.0
## 6   D3      S1 female 3.3
# Weiblich > männlich. D3 > D2 > D1. Vielleicht eine Interaktion.
gp %>%
  ggplot() +
  aes(y = F1, x = year, fill = sex) + 
  geom_boxplot()

# sex between, year within
gp %>%
  mutate(Fac = interaction(sex, year)) %>%
  select(student, Fac) %>%
  table()
##        Fac
## student female.D1 male.D1 female.D2 male.D2 female.D3 male.D3
##    S1           2       0         2       0         2       0
##    S10          0       2         0       2         0       2
##    S100         0       2         0       2         0       2
##    S101         2       0         2       0         2       0
##    S102         0       2         0       2         0       2
##    S103         2       0         2       0         2       0
##    S104         2       0         2       0         2       0
##    S105         2       0         2       0         2       0
##    S106         0       2         0       2         0       2
##    S107         0       2         0       2         0       2
##    S108         0       2         0       2         0       2
##    S109         0       2         0       2         0       2
##    S11          2       0         2       0         2       0
##    S110         0       2         0       2         0       2
##    S111         2       0         2       0         2       0
##    S112         2       0         2       0         2       0
##    S113         0       2         0       2         0       2
##    S114         2       0         2       0         2       0
##    S115         2       0         2       0         2       0
##    S116         2       0         2       0         2       0
##    S117         2       0         2       0         2       0
##    S118         2       0         2       0         2       0
##    S119         0       2         0       2         0       2
##    S12          2       0         2       0         2       0
##    S120         0       2         0       2         0       2
##    S121         0       2         0       2         0       2
##    S122         2       0         2       0         2       0
##    S123         0       2         0       2         0       2
##    S124         2       0         2       0         2       0
##    S125         0       2         0       2         0       2
##    S126         2       0         2       0         2       0
##    S127         0       2         0       2         0       2
##    S128         2       0         2       0         2       0
##    S129         2       0         2       0         2       0
##    S13          0       2         0       2         0       2
##    S130         0       2         0       2         0       2
##    S131         2       0         2       0         2       0
##    S132         0       2         0       2         0       2
##    S133         0       2         0       2         0       2
##    S134         2       0         2       0         2       0
##    S135         2       0         2       0         2       0
##    S136         2       0         2       0         2       0
##    S137         0       2         0       2         0       2
##    S138         2       0         2       0         2       0
##    S139         2       0         2       0         2       0
##    S14          2       0         2       0         2       0
##    S140         0       2         0       2         0       2
##    S141         2       0         2       0         2       0
##    S142         2       0         2       0         2       0
##    S143         2       0         2       0         2       0
##    S144         2       0         2       0         2       0
##    S145         2       0         2       0         2       0
##    S146         2       0         2       0         2       0
##    S147         0       2         0       2         0       2
##    S148         0       2         0       2         0       2
##    S149         2       0         2       0         2       0
##    S15          0       2         0       2         0       2
##    S150         0       2         0       2         0       2
##    S151         2       0         2       0         2       0
##    S152         0       2         0       2         0       2
##    S153         2       0         2       0         2       0
##    S154         0       2         0       2         0       2
##    S155         0       2         0       2         0       2
##    S156         0       2         0       2         0       2
##    S157         2       0         2       0         2       0
##    S158         2       0         2       0         2       0
##    S159         2       0         2       0         2       0
##    S16          2       0         2       0         2       0
##    S160         2       0         2       0         2       0
##    S161         0       2         0       2         0       2
##    S162         2       0         2       0         2       0
##    S163         2       0         2       0         2       0
##    S164         0       2         0       2         0       2
##    S165         2       0         2       0         2       0
##    S166         2       0         2       0         2       0
##    S167         0       2         0       2         0       2
##    S168         0       2         0       2         0       2
##    S169         0       2         0       2         0       2
##    S17          0       2         0       2         0       2
##    S170         0       2         0       2         0       2
##    S171         0       2         0       2         0       2
##    S172         2       0         2       0         2       0
##    S173         2       0         2       0         2       0
##    S174         2       0         2       0         2       0
##    S175         0       2         0       2         0       2
##    S176         0       2         0       2         0       2
##    S177         0       2         0       2         0       2
##    S178         0       2         0       2         0       2
##    S179         2       0         2       0         2       0
##    S18          0       2         0       2         0       2
##    S180         0       2         0       2         0       2
##    S181         0       2         0       2         0       2
##    S182         2       0         2       0         2       0
##    S183         0       2         0       2         0       2
##    S184         2       0         2       0         2       0
##    S185         2       0         2       0         2       0
##    S186         2       0         2       0         2       0
##    S187         2       0         2       0         2       0
##    S188         2       0         2       0         2       0
##    S189         0       2         0       2         0       2
##    S19          2       0         2       0         2       0
##    S190         0       2         0       2         0       2
##    S191         2       0         2       0         2       0
##    S192         2       0         2       0         2       0
##    S193         0       2         0       2         0       2
##    S194         0       2         0       2         0       2
##    S195         0       2         0       2         0       2
##    S196         2       0         2       0         2       0
##    S197         2       0         2       0         2       0
##    S198         0       2         0       2         0       2
##    S199         2       0         2       0         2       0
##    S2           0       2         0       2         0       2
##    S20          0       2         0       2         0       2
##    S200         0       2         0       2         0       2
##    S21          2       0         2       0         2       0
##    S22          0       2         0       2         0       2
##    S23          0       2         0       2         0       2
##    S24          2       0         2       0         2       0
##    S25          2       0         2       0         2       0
##    S26          0       2         0       2         0       2
##    S27          0       2         0       2         0       2
##    S28          2       0         2       0         2       0
##    S29          2       0         2       0         2       0
##    S3           2       0         2       0         2       0
##    S30          2       0         2       0         2       0
##    S31          2       0         2       0         2       0
##    S32          2       0         2       0         2       0
##    S33          2       0         2       0         2       0
##    S34          0       2         0       2         0       2
##    S35          0       2         0       2         0       2
##    S36          0       2         0       2         0       2
##    S37          0       2         0       2         0       2
##    S38          2       0         2       0         2       0
##    S39          0       2         0       2         0       2
##    S4           0       2         0       2         0       2
##    S40          2       0         2       0         2       0
##    S41          2       0         2       0         2       0
##    S42          0       2         0       2         0       2
##    S43          2       0         2       0         2       0
##    S44          2       0         2       0         2       0
##    S45          2       0         2       0         2       0
##    S46          0       2         0       2         0       2
##    S47          2       0         2       0         2       0
##    S48          2       0         2       0         2       0
##    S49          0       2         0       2         0       2
##    S5           0       2         0       2         0       2
##    S50          0       2         0       2         0       2
##    S51          0       2         0       2         0       2
##    S52          2       0         2       0         2       0
##    S53          0       2         0       2         0       2
##    S54          2       0         2       0         2       0
##    S55          0       2         0       2         0       2
##    S56          0       2         0       2         0       2
##    S57          0       2         0       2         0       2
##    S58          2       0         2       0         2       0
##    S59          0       2         0       2         0       2
##    S6           2       0         2       0         2       0
##    S60          0       2         0       2         0       2
##    S61          0       2         0       2         0       2
##    S62          0       2         0       2         0       2
##    S63          2       0         2       0         2       0
##    S64          2       0         2       0         2       0
##    S65          0       2         0       2         0       2
##    S66          2       0         2       0         2       0
##    S67          2       0         2       0         2       0
##    S68          0       2         0       2         0       2
##    S69          0       2         0       2         0       2
##    S7           0       2         0       2         0       2
##    S70          0       2         0       2         0       2
##    S71          2       0         2       0         2       0
##    S72          2       0         2       0         2       0
##    S73          0       2         0       2         0       2
##    S74          0       2         0       2         0       2
##    S75          2       0         2       0         2       0
##    S76          0       2         0       2         0       2
##    S77          2       0         2       0         2       0
##    S78          0       2         0       2         0       2
##    S79          2       0         2       0         2       0
##    S8           2       0         2       0         2       0
##    S80          2       0         2       0         2       0
##    S81          2       0         2       0         2       0
##    S82          2       0         2       0         2       0
##    S83          2       0         2       0         2       0
##    S84          0       2         0       2         0       2
##    S85          2       0         2       0         2       0
##    S86          0       2         0       2         0       2
##    S87          2       0         2       0         2       0
##    S88          0       2         0       2         0       2
##    S89          0       2         0       2         0       2
##    S9           0       2         0       2         0       2
##    S90          2       0         2       0         2       0
##    S91          0       2         0       2         0       2
##    S92          2       0         2       0         2       0
##    S93          0       2         0       2         0       2
##    S94          2       0         2       0         2       0
##    S95          2       0         2       0         2       0
##    S96          2       0         2       0         2       0
##    S97          0       2         0       2         0       2
##    S98          2       0         2       0         2       0
##    S99          2       0         2       0         2       0
# Vereinfachung: keine Interaktion.
gp %>%
  lmer(F1 ~ year * sex + (year|student), .) %>%
  step()
## boundary (singular) fit: see help('isSingular')
## boundary (singular) fit: see help('isSingular')
## Backward reduced random-effect table:
## 
##                          Eliminated npar  logLik    AIC    LRT Df Pr(>Chisq)
## <none>                                13 -162.26 350.53                     
## year in (year | student)          0    8 -233.15 482.30 141.77  5  < 2.2e-16
##                             
## <none>                      
## year in (year | student) ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Backward reduced fixed-effect table:
## Degrees of freedom method: Satterthwaite 
## 
##          Eliminated  Sum Sq Mean Sq NumDF  DenDF  F value    Pr(>F)    
## year:sex          1  0.2674  0.1337     2 313.83   2.9956  0.051441 .  
## year              0 16.0399  8.0200     2 315.22 179.6661 < 2.2e-16 ***
## sex               0  0.4949  0.4949     1 198.21  11.0864  0.001037 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Model found:
## F1 ~ year + sex + (year | student)
# Trotzdem ein singularity. 
gp %>%
  lmer(F1 ~ year + sex + (year|student), .) %>%
  anova()
## boundary (singular) fit: see help('isSingular')
## Type III Analysis of Variance Table with Satterthwaite's method
##       Sum Sq Mean Sq NumDF  DenDF F value    Pr(>F)    
## year 16.0399  8.0200     2 315.22 179.666 < 2.2e-16 ***
## sex   0.4949  0.4949     1 198.21  11.086  0.001037 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
# Die Singularity kommt vor, eventuell 
# weil nur 2 Beobachtungen pro Sprecher pro Jahr. 
# Daher manuell auf (1|student) vereinfachen. 
# Vielleicht aber dann year * sex wieder dazu nehmen. 
# Jetzt ist alles sig.
gp %>%
  lmer(F1 ~ year * sex + (1|student), .) %>%
  anova()
## Type III Analysis of Variance Table with Satterthwaite's method
##          Sum Sq Mean Sq NumDF DenDF  F value    Pr(>F)    
## year     35.042 17.5209     2   996 284.7790 < 2.2e-16 ***
## sex       0.983  0.9829     1   198  15.9755  9.05e-05 ***
## year:sex  0.694  0.3471     2   996   5.6415  0.003662 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
# Post-hoc tests
gp %>%
  lmer(F1 ~ year * sex + (1|student), .) %>%
  emmeans(., ~ year * sex) %>%
  pairs(., simple = "each", combine=T)
##  sex    year contrast      estimate     SE  df t.ratio p.value
##  female .    D1 - D2        -0.2457 0.0242 996 -10.151  <.0001
##  female .    D1 - D3        -0.4771 0.0242 996 -19.711  <.0001
##  female .    D2 - D3        -0.2314 0.0242 996  -9.561  <.0001
##  male   .    D1 - D2        -0.1695 0.0254 996  -6.659  <.0001
##  male   .    D1 - D3        -0.3611 0.0254 996 -14.188  <.0001
##  male   .    D2 - D3        -0.1916 0.0254 996  -7.528  <.0001
##  .      D1   female - male   0.0838 0.0422 329   1.985  0.4314
##  .      D2   female - male   0.1600 0.0422 329   3.792  0.0016
##  .      D3   female - male   0.1998 0.0422 329   4.737  <.0001
## 
## Degrees-of-freedom method: kenward-roger 
## P value adjustment: bonferroni method for 9 tests

Jahr (\(F[2, 996] = 284.8, p < 0.001\)) und Geschlecht (\(F[1, 198] = 16.0, p < 0.001\)) beinflussten F1 signifikant, und es gab eine signifikante Interaktion zwischen diesen Faktoren (\(F[2, 996] = 5.6, p < 0.01\)). Post-hoc Tests zeigten signifikante Unterschiede zwischen allen paarweisen Kombinationen von Jahren für männlich (\(p < 0.001\)) und für weiblich (\(p < 0.001\)). Die männlich-weiblich Unterschiede waren signifikant im Jahr 2 (\(p < 0.01\)) und im Jahr 3 (\(p < 0.001\)) aber nicht im Jahr 1.