class: center, middle, inverse, title-slide .title[ # Introduction to R for Data Analysis ] .subtitle[ ## Confirmatory Data Analysis ] .author[ ### Johannes Breuer, Stefan Jünger, Veronika Batzdorfer ] .date[ ### 2021-08-18 ] --- layout: true --- ## Confirmatory data analysis Yesterday, we covered exploratory data analysis (EDA). In contrast to that, the purpose of confirmatory analyses is typically testing hypotheses. As for EDA, we will first discuss how to conduct confirmatory data analyses in this session, and then look at visualization options in the following session (this afternoon). Again, as this is not a statistics course - and because you probably (want to) use many different analysis methods (some of which we are quite likely not familiar with) - we will only cover some of the basics in this session. While we do cover some other topics as well, our focus will be on regression. --- ## Content of this session .pull-left[ **What we will cover** - Using (more or less) simple regression models - OLS, GLM, and the like - How to re-use the results of these models - How to feed these results into tables ] .pull-right[ **What we won't cover** - Theory (and history) of hypothesis testing - Crazy complex models with elaborated estimators - e.g., no multilevel models - also no clustered standard errors - Bayesian statistics ] --- ## Fake Research Question .pull-left[ Say we're interested in xenophobic attitudes. We'd like to investigate how social trust and contact to foreigners might reduce them, and how party choices may contribute to higher levels of xenophobia. ] .pull-right[ </br> <img src="data:image/png;base64,#../img/4iq3kg.jpg" width="813" style="display: block; margin: auto;" /> .center[.tinyisher[https://imgflip.com/memegenerator/Trump-Bill-Signing] ] ] --- ## Data in this session In this session, we will, again, use the data from the *GGSS 2021*. As before, we need to load the data. ```r library(haven) allbus_2021_cda <- read_spss("./data/allbus_2021/ZA5280_v1-0-0.sav") ``` *Note*: Again, we start from scratch, which means we are loading the data as published by GESIS. All data wrangling steps from the previous days are not part of the data. --- ## Building/Manipulating variables ```r library(dplyr) library(forcats) library(sjlabelled) allbus_2021_cda <- allbus_2021_cda %>% remove_all_labels() %>% mutate( sex = recode_factor(sex, `1` = "Male", `2` = "Female", `3` = "Non-binary"), region = recode_factor( eastwest, `1` = "Western Germany", `2` = "Eastern Germany" ), xenophobia = rowMeans(across(ma01b:ma04, ~as.numeric(.x))), trust = ifelse(st01 == 1, 1, 0), contact = rowSums(across(mc01:mc04, ~as.numeric(.x))), party = recode_factor( pv01, `1`= "CDU-CSU", `2`= "SPD", `3` = "FDP", `4` = "Gruene", `6` = "Linke", `42` = "AfD", `90` = "Other party", `91` = "Would not vote"), person_weight = as.numeric(wghtpew) ) ``` --- ## `R` is rich in statistical procedures Generally, if you seek to use a specific statistical method in `R`, chances are quite high that you can easily do that. As we've said before: There's ~~an app~~ a package for that. After all, `R` is a statistical programming language that was originally developed by statisticians. --- ## Formulas in statistical software Before we start analyzing data, we should make ourselves familiar with some more terminology in `R`. As in other statistical languages, e.g., regression models require the definition of dependent and independent variables. For example, in *Stata* you would write: ```r y x1 x2 x3 ``` *SPSS* is more literate by requiring you to state what your dependent variables are with the `/DEPENDENT` parameter. --- ## `R` is straightforward and literate `R` combines the best of two worlds: It is straightforward to write formulas and it is quite literate regarding what role a specific element of a formula plays. ```r y ~ x1 + x2 + x3 ``` *Note*: Formulas represent a specific object class in `R`. ```r class(y ~ x1 + x2 + x3) ``` ``` ## [1] "formula" ``` --- ## Denoting the left-hand side with `~` In `R`, stating what your dependent variable is very similar to common mathematical notation: `$$y \sim N(\theta, \epsilon)$$` It states that a specific relationship is actually _estimated_, but we, fortunately, don't have to specify errors here. ```r y ~ x1 + x2 + x3 ``` Yet, sometimes it may be a good idea to at least explicitly specify the intercept as here: ```r y ~ 1 + x1 + x2 + x3 ``` --- ## Intercept We can also estimate models without an intercept: ```r y ~ x1 + x2 + x3 - 1 ``` Or intercept-only models as well: ```r y ~ 1 ``` --- ## Adding predictors with `+` You can add as many predictors/covariates as you want with the simple `+` operator. See: ```r y ~ 1 + x1 + x2 + x3 + x4 + x5 + x6 + x7 + x8 + x9 + x10 + x11 + x12 + x13 + x14 + x15 + x16 + x17 + x18 + x19 + x20 + x21 + x22 + x23 + x24 ``` There's also a shortcut for using all (remaining) variables in a data set as predictors: ```r y ~ . ``` --- ## Interaction effects with `*` and `:` We can also easily add interaction effects to a model. As this is the same as multiplying predictor variables, we also use the `*` sign for that. ```r y ~ x1 * x2 ``` The code above creates a model formula that includes both the main effects of `x1` and `x2`, and their interaction denoted by `x1:x2`. We can even be more explicit and write that into the formula directly: ```r y ~ x1 + x2 + x1:x2 ``` Later, we will see how all of this looks when we actually feed regression models with these formulas. --- ## Transforming variables within a formula One last point before we dive into doing some actual analysis is transforming variables. This procedure is rather common in regression analysis. It is also straightforward to do in `R`. For simple transformations this can be done as follows: ```r y ~ log(x) # computes the log10 for x y ~ scale(x) # z-transformation of x ``` We could also change the data type of variables within a function, e.g., by converting a numeric variable to a factor using `as.factor(x)`. --- ## Transforming variables within a formula If you cannot use a specific function for your tansformation, you have to wrap the operation in the `I()` function. For example: ```r y ~ x + I(x^2) # add a quadratic term of x ``` *Note*: Of course, there are also functions in `R` for transforming variables (e.g., standardizing or centering) before we use them in a formula. Besides the `base R` function `scale()` the [`datawizard package`](https://easystats.github.io/datawizard/), e.g., provides a few functions for that. --- ## Where to use formulas? The previous descriptions mainly refer to formulas used in regression models in `R`. However, formulas are also used in other hypothesis testing methods that distinguish between dependent and variables, such as t-tests or ANOVA. We will try out some of those in the following... --- ## Testing group differences in the distribution A very common methods for analyzing group differences are t-tests. You can use the `t.test()` function from `base R` function to easily perform such a test. ```r t.test(xenophobia ~ region, data = allbus_2021_cda) ``` ``` ## ## Welch Two Sample t-test ## ## data: xenophobia by region ## t = -8.9737, df = 1947.9, p-value < 2.2e-16 ## alternative hypothesis: true difference in means between group Western Germany and group Eastern Germany is not equal to 0 ## 95 percent confidence interval: ## -0.5985355 -0.3838395 ## sample estimates: ## mean in group Western Germany mean in group Eastern Germany ## 2.929174 3.420362 ``` .small[ *Note*: By default, `R` uses [Welch's t-test](https://en.wikipedia.org/wiki/Welch%27s_t-test) (instead of [Student's t-test](https://en.wikipedia.org/wiki/Student%27s_t-test)) which does not assume homogeneity of variance across groups. ] --- ## Test of normality What if our data are not normally distributed in the first place, thus, violating one of the basic assumptions of performing t-tests? To check this, we can use a [Shapiro-Wilk](https://en.wikipedia.org/wiki/Shapiro%E2%80%93Wilk_test) test of normality. ```r shapiro.test(allbus_2021_cda$xenophobia) ``` ``` ## ## Shapiro-Wilk normality test ## ## data: allbus_2021_cda$xenophobia ## W = 0.93885, p-value < 2.2e-16 ``` --- ## Wilcoxon/Mann-Whitney test If the data are not normally distributed, the [Wilcoxon/Mann-Whitney](https://en.wikipedia.org/wiki/Mann%E2%80%93Whitney_U_test) test can be a suitable alternative. ```r wilcox.test(xenophobia ~ region, data = allbus_2021_cda) ``` ``` ## ## Wilcoxon rank sum test with continuity correction ## ## data: xenophobia by region ## W = 958320, p-value < 2.2e-16 ## alternative hypothesis: true location shift is not equal to 0 ``` --- ## Testing multiple groups with an ANOVA There are situations in which we want to test differences across multiple groups. The classic method to use for this is an analysis of variance (ANOVA) and its many variants (ANCOVA, MANOVA, etc.). Again, you can easily do that in `R` using the `aov()` function. ```r anova <- aov(xenophobia ~ party, data = allbus_2021_cda) anova ``` ``` ## Call: ## aov(formula = xenophobia ~ party, data = allbus_2021_cda) ## ## Terms: ## party Residuals ## Sum of Squares 1135.314 3843.876 ## Deg. of Freedom 7 2459 ## ## Residual standard error: 1.250275 ## Estimated effects may be unbalanced ## 2875 Beobachtungen als fehlend gelöscht ``` --- ## Testing multiple groups with an ANOVA To get some more detailed information, you need to use the `summary()` function we have already seen in the EDA session on the resulting `anova` object. ```r summary(anova) ``` ``` ## Df Sum Sq Mean Sq F value Pr(>F) ## party 7 1135 162.19 103.8 <2e-16 *** ## Residuals 2459 3844 1.56 ## --- ## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 ## 2875 Beobachtungen als fehlend gelöscht ``` --- ## Post-hoc test Unfortunately, the previous output only indicates that there are statistically significant differences in the groups. To find out which groups differ from each other we can, for example, compute *Tukey Honest Significant Differences*. ```r TukeyHSD(anova) ``` ``` ## Tukey multiple comparisons of means ## 95% family-wise confidence level ## ## Fit: aov(formula = xenophobia ~ party, data = allbus_2021_cda) ## ## $party ## diff lwr upr p adj ## SPD-CDU-CSU -0.326203370 -0.5694692066 -0.08293753 0.0012679 ## FDP-CDU-CSU -0.079170655 -0.3460708673 0.18772956 0.9861340 ## Gruene-CDU-CSU -1.126015400 -1.3459306768 -0.90610012 0.0000000 ## Linke-CDU-CSU -0.671862440 -0.9849863899 -0.35873849 0.0000000 ## AfD-CDU-CSU 1.582962928 1.2547219264 1.91120393 0.0000000 ## Other party-CDU-CSU -0.086609540 -0.5006409383 0.32742186 0.9983996 ## Would not vote-CDU-CSU 0.332838302 -0.0479902973 0.71366690 0.1384344 ## FDP-SPD 0.247032716 -0.0430725160 0.53713795 0.1624736 ## Gruene-SPD -0.799812030 -1.0473762655 -0.55224779 0.0000000 ## Linke-SPD -0.345659070 -0.6787835658 -0.01253457 0.0355204 ## AfD-SPD 1.909166298 1.5617940526 2.25653854 0.0000000 ## Other party-SPD 0.239593830 -0.1897630384 0.66895070 0.6920689 ## Would not vote-SPD 0.659041672 0.2616052069 1.05647814 0.0000145 ## Gruene-FDP -1.046844746 -1.3176685020 -0.77602099 0.0000000 ## Linke-FDP -0.592691785 -0.9434472360 -0.24193633 0.0000088 ## AfD-FDP 1.662133583 1.2978192494 2.02644792 0.0000000 ## Other party-FDP -0.007438886 -0.4506146710 0.43573690 1.0000000 ## Would not vote-FDP 0.412008956 -0.0003176133 0.82433553 0.0503423 ## Linke-Gruene 0.454152961 0.1376780142 0.77062791 0.0003717 ## AfD-Gruene 2.708978328 2.3775391353 3.04041752 0.0000000 ## Other party-Gruene 1.039405860 0.6228343991 1.45597732 0.0000000 ## Would not vote-Gruene 1.458853702 1.0752651133 1.84244229 0.0000000 ## AfD-Linke 2.254825368 1.8554060167 2.65424472 0.0000000 ## Other party-Linke 0.585252899 0.1127958524 1.05770995 0.0043480 ## Would not vote-Linke 1.004700742 0.5610521365 1.44834935 0.0000000 ## Other party-AfD -1.669572468 -2.1521812210 -1.18696372 0.0000000 ## Would not vote-AfD -1.250124626 -1.7045689370 -0.79568032 0.0000000 ## Would not vote-Other party 0.419447842 -0.1003593098 0.93925499 0.2188817 ``` --- class: center, middle # [Exercise](https://stefanjuenger.github.io/r-intro-gesis-2022/exercises/Exercise_4_1_1_t-test_ANOVA.html) time 🏋️♀️💪🏃🚴 ## [Solutions](https://stefanjuenger.github.io/r-intro-gesis-2022/solutions/Exercise_4_1_1_t-test_ANOVA.html) --- ## Simple linear regressions This may not come as a surprise at this point, but regression models are also easy to perform in `R`. The function for this is `lm()`. ```r simple_linear_model <- lm( xenophobia ~ age + sex + region + trust + contact + party, data = allbus_2021_cda ) simple_linear_model ``` .right[↪️] --- class: middle .small[ ``` ## ## Call: ## lm(formula = xenophobia ~ age + sex + region + trust + contact + ## party, data = allbus_2021_cda) ## ## Coefficients: ## (Intercept) age sexFemale ## 1.06782 0.01724 -0.09238 ## sexNon-binary regionEastern Germany trust ## -0.67122 0.04532 -0.35851 ## contact partySPD partyFDP ## 0.20248 -0.31008 0.16462 ## partyGruene partyLinke partyAfD ## -0.72487 -0.57422 1.62736 ## partyOther party partyWould not vote ## 0.20451 0.43211 ``` ] --- ## Simple linear regressions As for the ANOVA, we can get some more detailed (and nicely formatted) output using the well-known `summary()` function. ```r summary(simple_linear_model) ``` .right[↪️] --- class: middle .small[ ``` ## ## Call: ## lm(formula = xenophobia ~ age + sex + region + trust + contact + ## party, data = allbus_2021_cda) ## ## Residuals: ## Min 1Q Median 3Q Max ## -4.0481 -0.7572 -0.1604 0.6423 4.8629 ## ## Coefficients: ## Estimate Std. Error t value Pr(>|t|) ## (Intercept) 1.067821 0.140568 7.596 4.53e-14 *** ## age 0.017243 0.001521 11.338 < 2e-16 *** ## sexFemale -0.092382 0.049296 -1.874 0.061062 . ## sexNon-binary -0.671223 1.128092 -0.595 0.551902 ## regionEastern Germany 0.045317 0.056502 0.802 0.422619 ## trust -0.358505 0.055423 -6.469 1.22e-10 *** ## contact 0.202481 0.021256 9.526 < 2e-16 *** ## partySPD -0.310082 0.078718 -3.939 8.44e-05 *** ## partyFDP 0.164625 0.084909 1.939 0.052654 . ## partyGruene -0.724873 0.072363 -10.017 < 2e-16 *** ## partyLinke -0.574221 0.103795 -5.532 3.55e-08 *** ## partyAfD 1.627359 0.106497 15.281 < 2e-16 *** ## partyOther party 0.204508 0.129338 1.581 0.113984 ## partyWould not vote 0.432107 0.118388 3.650 0.000269 *** ## --- ## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 ## ## Residual standard error: 1.123 on 2127 degrees of freedom ## (3201 Beobachtungen als fehlend gelöscht) ## Multiple R-squared: 0.3561, Adjusted R-squared: 0.3522 ## F-statistic: 90.48 on 13 and 2127 DF, p-value: < 2.2e-16 ``` ] --- ## Checking regression assumptions As in the case of ANOVA, we do not cover the topic of testing regression assumptions in this session. Of course, when you do some actual analyses, you should definitely do that. We will cover some assumption checks (and model diagnostics) in the following data visualization session, but if you want more information about this issue, there are plenty of good tutorials online (such as [this blog post by Ian Ruginski](https://www.ianruginski.com/post/regressionassumptions/) or [this chapter](https://bookdown.org/jimr1603/Intermediate_R_-_R_for_Survey_Analysis/testing-regression-assumptions.html) in the online book [*R for Survey Analysis*](https://bookdown.org/jimr1603/Intermediate_R_-_R_for_Survey_Analysis/)). --- ## Dummy coding of categorical predictors As you have seen, `R` automatically converts factors in a regression model to dummy-coded variables, with the reference being the first value level. Hence, there is no need to create several variables with dummy codes and add them one by one to the regression formula. You can inspect the contrast matrix using: .pull-left[ ```r contrasts(allbus_2021_cda$party) ``` ] .pull-right[ ``` ## SPD FDP Gruene Linke AfD Other party Would not vote ## CDU-CSU 0 0 0 0 0 0 0 ## SPD 1 0 0 0 0 0 0 ## FDP 0 1 0 0 0 0 0 ## Gruene 0 0 1 0 0 0 0 ## Linke 0 0 0 1 0 0 0 ## AfD 0 0 0 0 1 0 0 ## Other party 0 0 0 0 0 1 0 ## Would not vote 0 0 0 0 0 0 1 ``` ] --- ## Changing the reference category for a categorical predictor If you want to change the reference category for a categorical predictor, you can use the `base R` function `relevel()` within the regression formula. ```r lm_relevel <- lm( xenophobia ~ age + sex + region + trust + contact + relevel(party, ref = 6), data = allbus_2021_cda ) summary(lm_relevel) ``` .right[↪️] --- class: middle .small[ ``` ## ## Call: ## lm(formula = xenophobia ~ age + sex + region + trust + contact + ## relevel(party, ref = 6), data = allbus_2021_cda) ## ## Residuals: ## Min 1Q Median 3Q Max ## -4.0481 -0.7572 -0.1604 0.6423 4.8629 ## ## Coefficients: ## Estimate Std. Error t value Pr(>|t|) ## (Intercept) 2.695180 0.158202 17.036 < 2e-16 *** ## age 0.017243 0.001521 11.338 < 2e-16 *** ## sexFemale -0.092382 0.049296 -1.874 0.0611 . ## sexNon-binary -0.671223 1.128092 -0.595 0.5519 ## regionEastern Germany 0.045317 0.056502 0.802 0.4226 ## trust -0.358505 0.055423 -6.469 1.22e-10 *** ## contact 0.202481 0.021256 9.526 < 2e-16 *** ## relevel(party, ref = 6)CDU-CSU -1.627359 0.106497 -15.281 < 2e-16 *** ## relevel(party, ref = 6)SPD -1.937440 0.112554 -17.213 < 2e-16 *** ## relevel(party, ref = 6)FDP -1.462734 0.116099 -12.599 < 2e-16 *** ## relevel(party, ref = 6)Gruene -2.352232 0.108024 -21.775 < 2e-16 *** ## relevel(party, ref = 6)Linke -2.201580 0.129773 -16.965 < 2e-16 *** ## relevel(party, ref = 6)Other party -1.422850 0.150483 -9.455 < 2e-16 *** ## relevel(party, ref = 6)Would not vote -1.195251 0.141602 -8.441 < 2e-16 *** ## --- ## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 ## ## Residual standard error: 1.123 on 2127 degrees of freedom ## (3201 Beobachtungen als fehlend gelöscht) ## Multiple R-squared: 0.3561, Adjusted R-squared: 0.3522 ## F-statistic: 90.48 on 13 and 2127 DF, p-value: < 2.2e-16 ``` ] --- ## Different coding example: Effect coding How to include a factor variable in a regression model can be changed in `R`. For a full overview of different options, you can, e.g., have a look at this [tutorial](https://stats.idre.ucla.edu/r/library/r-library-contrast-coding-systems-for-categorical-variables). Let's try one alternative option: The so-called effect coding or deviation coding, which compares the mean at a given level to the overall mean. You can create effect-coded dummies by changing the contrasts as follows: ```r contrasts(allbus_2021_cda$party) <- contr.sum(8) ``` --- ## Effect coding contrast matrix ```r contrasts(allbus_2021_cda$party) ``` ``` ## [,1] [,2] [,3] [,4] [,5] [,6] [,7] ## CDU-CSU 1 0 0 0 0 0 0 ## SPD 0 1 0 0 0 0 0 ## FDP 0 0 1 0 0 0 0 ## Gruene 0 0 0 1 0 0 0 ## Linke 0 0 0 0 1 0 0 ## AfD 0 0 0 0 0 1 0 ## Other party 0 0 0 0 0 0 1 ## Would not vote -1 -1 -1 -1 -1 -1 -1 ``` --- ## Effect coding regression ```r simple_linear_model_effect_coded <- lm( xenophobia ~ age + sex + region + trust + contact + party, data = allbus_2021_cda ) summary(simple_linear_model_effect_coded) ``` .right[↪️] --- class: middle .small[ ``` ## ## Call: ## lm(formula = xenophobia ~ age + sex + region + trust + contact + ## party, data = allbus_2021_cda) ## ## Residuals: ## Min 1Q Median 3Q Max ## -4.0481 -0.7572 -0.1604 0.6423 4.8629 ## ## Coefficients: ## Estimate Std. Error t value Pr(>|t|) ## (Intercept) 1.170249 0.129351 9.047 < 2e-16 *** ## age 0.017243 0.001521 11.338 < 2e-16 *** ## sexFemale -0.092382 0.049296 -1.874 0.0611 . ## sexNon-binary -0.671223 1.128092 -0.595 0.5519 ## regionEastern Germany 0.045317 0.056502 0.802 0.4226 ## trust -0.358505 0.055423 -6.469 1.22e-10 *** ## contact 0.202481 0.021256 9.526 < 2e-16 *** ## party1 -0.102428 0.052806 -1.940 0.0525 . ## party2 -0.412510 0.061480 -6.710 2.49e-11 *** ## party3 0.062197 0.066226 0.939 0.3478 ## party4 -0.827301 0.053902 -15.348 < 2e-16 *** ## party5 -0.676649 0.083764 -8.078 1.09e-15 *** ## party6 1.524931 0.086242 17.682 < 2e-16 *** ## party7 0.102080 0.106703 0.957 0.3388 ## --- ## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 ## ## Residual standard error: 1.123 on 2127 degrees of freedom ## (3201 Beobachtungen als fehlend gelöscht) ## Multiple R-squared: 0.3561, Adjusted R-squared: 0.3522 ## F-statistic: 90.48 on 13 and 2127 DF, p-value: < 2.2e-16 ``` ] --- ## Revert to dummy coding We can easily switch back to the default dummy coding using the `contr.treatment()` function. .pull-left[ ```r contrasts(allbus_2021_cda$party) <- contr.treatment(8, base = 1) contrasts(allbus_2021_cda$party) ``` ``` ## 2 3 4 5 6 7 8 ## CDU-CSU 0 0 0 0 0 0 0 ## SPD 1 0 0 0 0 0 0 ## FDP 0 1 0 0 0 0 0 ## Gruene 0 0 1 0 0 0 0 ## Linke 0 0 0 1 0 0 0 ## AfD 0 0 0 0 1 0 0 ## Other party 0 0 0 0 0 1 0 ## Would not vote 0 0 0 0 0 0 1 ``` ] .pull-right[ ```r contrasts(allbus_2021_cda$party) <- contr.treatment(8, base = 6) contrasts(allbus_2021_cda$party) ``` ``` ## 1 2 3 4 5 7 8 ## CDU-CSU 1 0 0 0 0 0 0 ## SPD 0 1 0 0 0 0 0 ## FDP 0 0 1 0 0 0 0 ## Gruene 0 0 0 1 0 0 0 ## Linke 0 0 0 0 1 0 0 ## AfD 0 0 0 0 0 0 0 ## Other party 0 0 0 0 0 1 0 ## Would not vote 0 0 0 0 0 0 1 ``` ] See what I did? --- ## Sidenote: weighting Of course, you also can use, e.g., survey design weights to adjust to estimates in `R`. For the `lm()` function, you would use the `weights` option. ```r weighted_regression <- lm( xenophobia ~ age + sex + trust + contact + party, weights = person_weight, data = allbus_2021_cda ) summary(weighted_regression) ``` ``` ## ## Call: ## lm(formula = xenophobia ~ age + sex + trust + contact + party, ## data = allbus_2021_cda, weights = person_weight) ## ## Weighted Residuals: ## Min 1Q Median 3Q Max ## -5.7061 -0.9525 -0.1911 0.8333 6.8100 ## ## Coefficients: ## Estimate Std. Error t value Pr(>|t|) ## (Intercept) 1.120294 0.135136 8.290 < 2e-16 *** ## age 0.016525 0.001477 11.191 < 2e-16 *** ## sexFemale -0.081405 0.048462 -1.680 0.0931 . ## sexNon-binary -0.572812 1.433144 -0.400 0.6894 ## trust -0.354750 0.054459 -6.514 9.10e-11 *** ## contact 0.198847 0.019743 10.072 < 2e-16 *** ## party2 -0.321437 0.076919 -4.179 3.05e-05 *** ## party3 0.178230 0.082452 2.162 0.0308 * ## party4 -0.684697 0.069764 -9.814 < 2e-16 *** ## party5 -0.629454 0.107743 -5.842 5.95e-09 *** ## party6 1.630801 0.108871 14.979 < 2e-16 *** ## party7 0.204408 0.128335 1.593 0.1114 ## party8 0.475295 0.118458 4.012 6.22e-05 *** ## --- ## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 ## ## Residual standard error: 1.429 on 2128 degrees of freedom ## (3201 Beobachtungen als fehlend gelöscht) ## Multiple R-squared: 0.3393, Adjusted R-squared: 0.3356 ## F-statistic: 91.07 on 12 and 2128 DF, p-value: < 2.2e-16 ``` --- ## Generalized linear regression What we have seen so far are estimates for linear OLS regression models. A standard `R` installation provides a multitude of other estimators/link functions, so-called family objects, e.g., binomial logistic or Poisson regression models through the `glm()` function. See `?family` for an overview. Let's look at the the example of logistic regression. For this purpose, say we are interested in the effect of the binary indicator of social trust on all the other variables. ```r table(allbus_2021_cda$trust) ``` ``` ## ## 0 1 ## 3911 1314 ``` --- ## Logistic regression ```r simple_model_logistic <- glm( trust ~ age + sex + region + contact + party, family = binomial(link = "logit"), data = allbus_2021_cda ) summary(simple_model_logistic) ``` .right[↪️] --- class: middle .small[ ``` ## ## Call: ## glm(formula = trust ~ age + sex + region + contact + party, family = binomial(link = "logit"), ## data = allbus_2021_cda) ## ## Deviance Residuals: ## Min 1Q Median 3Q Max ## -1.1590 -0.8576 -0.7146 1.3060 2.4295 ## ## Coefficients: ## Estimate Std. Error z value Pr(>|z|) ## (Intercept) -0.726452 0.280669 -2.588 0.009645 ** ## age 0.006064 0.003076 1.971 0.048725 * ## sexFemale -0.389110 0.099134 -3.925 8.67e-05 *** ## sexNon-binary 13.118355 324.743748 0.040 0.967777 ## regionEastern Germany 0.059212 0.114060 0.519 0.603666 ## contact -0.080598 0.042796 -1.883 0.059658 . ## party2 0.005664 0.158246 0.036 0.971450 ## party3 0.115125 0.168295 0.684 0.493931 ## party4 0.574747 0.138534 4.149 3.34e-05 *** ## party5 0.325674 0.199942 1.629 0.103346 ## party6 -0.947937 0.267557 -3.543 0.000396 *** ## party7 -0.099621 0.267765 -0.372 0.709857 ## party8 -1.539394 0.380724 -4.043 5.27e-05 *** ## --- ## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 ## ## (Dispersion parameter for binomial family taken to be 1) ## ## Null deviance: 2587.3 on 2195 degrees of freedom ## Residual deviance: 2482.8 on 2183 degrees of freedom ## (3146 Beobachtungen als fehlend gelöscht) ## AIC: 2508.8 ## ## Number of Fisher Scoring iterations: 11 ``` ] --- ## Assessing model quality The [`performance` package](https://easystats.github.io/performance/) that is that is part of the [`easystats` collection of packages](https://easystats.github.io/easystats/) offers some functions for assessing model quality, including different types of R². A commonly used metric for logistic regression models, e.g., is Nagelkerke's R². ```r library(performance) r2_nagelkerke(simple_model_logistic) ``` ``` ## Nagelkerke's R2 ## 0.06714931 ``` *Note*: The `performance` package also includes several helpful functions for model diagnostics. --- ## Changing the link function For the fun of it, let's change the link function in our regression model from logit to probit. ```r simple_model_probit <- glm( trust ~ age + sex + region + contact + party, family = binomial(link = "probit"), data = allbus_2021_cda ) summary(simple_model_probit) ``` .right[↪️] --- class:middle .small[ ``` ## ## Call: ## glm(formula = trust ~ age + sex + region + contact + party, family = binomial(link = "probit"), ## data = allbus_2021_cda) ## ## Deviance Residuals: ## Min 1Q Median 3Q Max ## -1.1499 -0.8587 -0.7139 1.3080 2.4550 ## ## Coefficients: ## Estimate Std. Error z value Pr(>|z|) ## (Intercept) -0.451217 0.167099 -2.700 0.006928 ** ## age 0.003546 0.001828 1.940 0.052402 . ## sexFemale -0.234477 0.058973 -3.976 7.01e-05 *** ## sexNon-binary 4.739472 57.936001 0.082 0.934802 ## regionEastern Germany 0.036092 0.067849 0.532 0.594771 ## contact -0.047256 0.025459 -1.856 0.063424 . ## party2 0.003756 0.093901 0.040 0.968093 ## party3 0.067866 0.100437 0.676 0.499228 ## party4 0.347629 0.083533 4.162 3.16e-05 *** ## party5 0.193707 0.120820 1.603 0.108875 ## party6 -0.542017 0.145453 -3.726 0.000194 *** ## party7 -0.059551 0.157067 -0.379 0.704581 ## party8 -0.826761 0.187644 -4.406 1.05e-05 *** ## --- ## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1 ## ## (Dispersion parameter for binomial family taken to be 1) ## ## Null deviance: 2587.3 on 2195 degrees of freedom ## Residual deviance: 2482.7 on 2183 degrees of freedom ## (3146 Beobachtungen als fehlend gelöscht) ## AIC: 2508.7 ## ## Number of Fisher Scoring iterations: 10 ``` ] --- ## Comparing models with an ANOVA We can also compare models with some standard tools. For example, to examine competing models, such as our logistic and probit regression, we can apply an ANOVA. ```r anova(simple_model_logistic, simple_model_probit) ``` ``` ## Analysis of Deviance Table ## ## Model 1: trust ~ age + sex + region + contact + party ## Model 2: trust ~ age + sex + region + contact + party ## Resid. Df Resid. Dev Df Deviance ## 1 2183 2482.8 ## 2 2183 2482.7 0 0.068011 ``` --- ## Comparing model performance The `performance` package we have previously used for calculating Nagelkerke's R² for our logistic regression model also provides a handy function for comparing model performance. ```r compare_performance( simple_model_logistic, simple_model_probit, metrics = c("AIC", "BIC", "R2") ) ``` ``` ## # Comparison of Model Performance Indices ## ## Name | Model | AIC | AIC weights | BIC | BIC weights | Tjur's R2 | Nagelkerke's R2 ## ------------------------------------------------------------------------------------------------------------- ## simple_model_logistic | glm | 2508.784 | 0.491 | 2582.811 | 0.491 | 0.044 | ## simple_model_probit | glm | 2508.716 | 0.509 | 2582.743 | 0.509 | | 0.067 ``` --- ## Other regression variants While `glm()` already provides quite a few estimators and link functions, depending on the distribution of your dependent variable, you may need more specialized regression models. A few interesting options for that, e.g, include are the [`MASS` package](https://cran.r-project.org/web/packages/MASS/index.html) for negative binomial regression, the [`pscl` package](https://cran.r-project.org/web/packages/pscl/index.html) for zero-inflated (negative) binomial regression and hurdle models, or the [`mcp` package](https://lindeloev.github.io/mcp/) for regression with multiple change points. --- class: center, middle # [Exercise](https://stefanjuenger.github.io/r-intro-gesis-2022/exercises/Exercise_4_1_2_Regression_Analysis.html) time 🏋️♀️💪🏃🚴 ## [Solutions](https://stefanjuenger.github.io/r-intro-gesis-2022/solutions/Exercise_4_1_2_Regression_Analysis.html) --- ## Handling regression results While it is (still) common practice to run regressions, search for 'significant' p-values, and paste the results into a table without interpreting them substantially, this may not be the best thing to do. We will (briefly) discuss how to create nice regression tables later on, but before that, we will briefly talk about how we can apply some other techniques to gain some more substantial insights into our data using regression. To do that, we first need to look into how to work with a readily estimated regression object in `R`. This is also meant to show some of the mechanics of what is actually happening in the background when a regression is run in `R`. --- ## Accessing model results in `base R` Regression results are a specific type/class of objects in `R`. You can use the `str()` function to get an overview of the whole structure of the object (it's a list of different information). For starters, we may want to see what the first level of this list may provide by asking for the names of the included pieces of information: ```r names(simple_linear_model) ``` ``` ## [1] "coefficients" "residuals" "effects" "rank" ## [5] "fitted.values" "assign" "qr" "df.residual" ## [9] "na.action" "contrasts" "xlevels" "call" ## [13] "terms" "model" ``` --- ## Accessing coefficients We can access the coefficients from our model as follows: ```r simple_linear_model$coefficients ``` ``` ## (Intercept) age sexFemale ## 1.06782116 0.01724286 -0.09238226 ## sexNon-binary regionEastern Germany trust ## -0.67122309 0.04531679 -0.35850547 ## contact partySPD partyFDP ## 0.20248050 -0.31008195 0.16462466 ## partyGruene partyLinke partyAfD ## -0.72487317 -0.57422122 1.62735852 ## partyOther party partyWould not vote ## 0.20450803 0.43210733 ``` --- ## Accessing standard errors `lm` objects are a little bit cumbersome to use as the information is deeply nested within the object. If you want to extract the standard errors, e.g., you can do so as follows: ```r summary(simple_linear_model)$coefficients[,2] ``` ``` ## (Intercept) age sexFemale ## 0.14056837 0.00152080 0.04929583 ## sexNon-binary regionEastern Germany trust ## 1.12809160 0.05650183 0.05542306 ## contact partySPD partyFDP ## 0.02125645 0.07871806 0.08490929 ## partyGruene partyLinke partyAfD ## 0.07236338 0.10379503 0.10649711 ## partyOther party partyWould not vote ## 0.12933848 0.11838786 ``` --- ## Accessing confidence intervals The standard `summary()` doesn't supply confidence intervals. We can use the `confint()` command to produce them. For example, for the logistic regression: ```r confint(simple_model_logistic) ``` ``` ## 2.5 % 97.5 % ## (Intercept) -1.278347e+00 -0.177675712 ## age 5.083568e-05 0.012115185 ## sexFemale -5.840263e-01 -0.195306131 ## sexNon-binary -5.305962e+01 NA ## regionEastern Germany -1.651242e-01 0.282190396 ## contact -1.646441e-01 0.003181814 ## party2 -3.063953e-01 0.314466762 ## party3 -2.171769e-01 0.443180709 ## party4 3.041974e-01 0.847516085 ## party5 -7.060470e-02 0.714347877 ## party6 -1.499074e+00 -0.445001705 ## party7 -6.430226e-01 0.410980892 ## party8 -2.364780e+00 -0.852958679 ``` --- ## Alternatives for accessing model information Addon-packages, e.g., for creating tables, usually gather information about models (such as standard errors or confidence intervals). However, there are also other, less tedious ways of directly accessing model parameters. One such option is the [`parameters` package](https://easystats.github.io/parameters/) that is part of the [`easystats` collection of packages](https://easystats.github.io/easystats/). ```r library(parameters) model_parameters(simple_linear_model) ``` .right[↪️] --- class:middle .small[ ``` ## Parameter | Coefficient | SE | 95% CI | t(2127) | p ## ------------------------------------------------------------------------------------- ## (Intercept) | 1.07 | 0.14 | [ 0.79, 1.34] | 7.60 | < .001 ## age | 0.02 | 1.52e-03 | [ 0.01, 0.02] | 11.34 | < .001 ## sex [Female] | -0.09 | 0.05 | [-0.19, 0.00] | -1.87 | 0.061 ## sex [Non-binary] | -0.67 | 1.13 | [-2.88, 1.54] | -0.60 | 0.552 ## region [Eastern Germany] | 0.05 | 0.06 | [-0.07, 0.16] | 0.80 | 0.423 ## trust | -0.36 | 0.06 | [-0.47, -0.25] | -6.47 | < .001 ## contact | 0.20 | 0.02 | [ 0.16, 0.24] | 9.53 | < .001 ## party [SPD] | -0.31 | 0.08 | [-0.46, -0.16] | -3.94 | < .001 ## party [FDP] | 0.16 | 0.08 | [ 0.00, 0.33] | 1.94 | 0.053 ## party [Gruene] | -0.72 | 0.07 | [-0.87, -0.58] | -10.02 | < .001 ## party [Linke] | -0.57 | 0.10 | [-0.78, -0.37] | -5.53 | < .001 ## party [AfD] | 1.63 | 0.11 | [ 1.42, 1.84] | 15.28 | < .001 ## party [Other party] | 0.20 | 0.13 | [-0.05, 0.46] | 1.58 | 0.114 ## party [Would not vote] | 0.43 | 0.12 | [ 0.20, 0.66] | 3.65 | < .001 ``` ] --- ## (Simple) model predictions It is also quite straightforward to produce simple predictions from an estimated model using the `predict()` function in `R`. We can feed the `predict()` function with our own data to figure out what our model actually predicts when something changes. -- .pull-left[ .small[ ```r simple_linear_model_new <- lm(xenophobia ~ age + region + party, data = allbus_2021_cda) predictions_data <- data.frame( age = rep(mean(allbus_2021_cda$age, na.rm = TRUE), times = 4), region = as.factor(rep(c("Western Germany", "Eastern Germany"), each = 2)), party = as.factor(rep(c("CDU-CSU", "AfD"), times = 2)) ) predictions_data ``` ``` ## age region party ## 1 53.27089 Western Germany CDU-CSU ## 2 53.27089 Western Germany AfD ## 3 53.27089 Eastern Germany CDU-CSU ## 4 53.27089 Eastern Germany AfD ``` ] ] -- .pull-right[ .small[ ```r predict(object = simple_linear_model_new, newdata = predictions_data, interval = "confidence") ``` ``` ## fit lwr upr ## 1 3.062107 2.963214 3.160999 ## 2 4.749130 4.561993 4.936267 ## 3 3.325900 3.206925 3.444874 ## 4 5.012923 4.827720 5.198126 ``` ] ] --- ## More advanced post-estimation techniques In an OLS context, predictions of this kind are straightforward to interpret. For non-linear models, such as in logistic regression, this is more difficult: ```r simple_model_logistic_new <- glm( trust ~ age + region + party, family = binomial(link = "logit"), data = allbus_2021_cda ) predictions <- predict(object = simple_model_logistic_new, newdata = predictions_data) ``` Predictions have to be converted into probabilities: ```r exp(predictions) / (1 + exp(predictions)) ``` ``` ## 1 2 3 4 ## 0.2555001 0.1298738 0.2528970 0.1283301 ``` --- ## Average marginal effects (AME) AME provide a similar interpretation for a one-unit change as in OLS models: the average change of the dependent variable when all other variables are held constant (at their empirical value). The [`margins` package](https://cran.r-project.org/web/packages/margins/index.html) provides a simple function for AME. .pull-left[ ```r library(marginaleffects) plot_cme( simple_model_logistic_new, effect = "region", condition = "party" ) ``` ] .pull-right[ <img src="data:image/png;base64,#4_1_Confirmatory_Data_Analysis_files/figure-html/ame-2-1.png" style="display: block; margin: auto;" /> ] --- ## Regression tables As we have seen in the session on *Exploratory Data Analysis*, there are different options for creating tables as output in `R`. The ones we have looked at in the EDA session, [`stargazer`](https://cran.r-project.org/web/packages/stargazer/index.html) and [`gtsummary`](http://www.danieldsjoberg.com/gtsummary/), can be used for creating regression tables. The functions from these packages can also be used for comparing multiple regression models in one table. --- ## Example: Regression tables with the `stargazer` package ```r library(stargazer) reg_1 <- lm(xenophobia ~ age + sex + region, data = allbus_2021_cda) reg_2 <- lm(xenophobia ~ age + sex + region + trust, data = allbus_2021_cda) reg_3 <- glm(trust ~ age + sex + region, data = allbus_2021_cda, family = binomial(link = "logit")) reg_4 <- glm(trust ~ age + sex + region, data = allbus_2021_cda, family = binomial(link = "probit")) stargazer( reg_1, reg_2, reg_3, reg_4, type = "text", dep.var.labels = c("Xenophobia", "Trust"), covariate.labels = c("Age", "Female", "Non-binary", "Region (Reference = Western Germany", "Social Trust") ) ``` .right[↪️] --- class: center, middle .ssmall[ ``` ## ## ============================================================================================================= ## Dependent variable: ## ------------------------------------------------------------------------- ## Xenophobia Trust ## OLS logistic probit ## (1) (2) (3) (4) ## ------------------------------------------------------------------------------------------------------------- ## Age 0.023*** 0.023*** 0.003 0.002 ## (0.001) (0.001) (0.002) (0.001) ## ## Female -0.134*** -0.163*** -0.327*** -0.193*** ## (0.047) (0.047) (0.064) (0.038) ## ## Non-binary -1.735 -1.269 0.260 0.161 ## (1.337) (1.305) (1.226) (0.749) ## ## Region (Reference = Western Germany 0.418*** 0.400*** -0.115* -0.067 ## (0.050) (0.049) (0.069) (0.041) ## ## Social Trust -0.610*** ## (0.054) ## ## Constant 1.770*** 1.932*** -1.029*** -0.634*** ## (0.080) (0.079) (0.108) (0.064) ## ## ------------------------------------------------------------------------------------------------------------- ## Observations 3,216 3,159 5,178 5,178 ## R2 0.113 0.146 ## Adjusted R2 0.112 0.145 ## Log Likelihood -2,913.171 -2,913.182 ## Akaike Inf. Crit. 5,836.342 5,836.365 ## Residual Std. Error 1.337 (df = 3211) 1.303 (df = 3153) ## F Statistic 102.623*** (df = 4; 3211) 107.714*** (df = 5; 3153) ## ============================================================================================================= ## Note: *p<0.1; **p<0.05; ***p<0.01 ``` ] --- ## Example: Regression tables with the `stargazer` package As for the summary table, the `stargazer()` output can also be saved in various formats, such as `LaTeX`. .small[ ```r # If you have not done so before, you need to create a directory for output files first # dir.create("./output") stargazer( reg_1, reg_2, reg_3, reg_4, type = "latex", dep.var.labels = c("Xenophobia", "Trust"), covariate.labels = c("Age", "Female", "Non-binary", "Region (Reference = Western Germany", "Social Trust"), out = "./output/stargazer_regression.tex" ) ``` ] --- ## Example: Regression tables with the `huxtable` package ```r library(huxtable) huxreg_table <- huxreg( reg_1, reg_2, reg_3, reg_4, coefs = c( "(Intercept)", "Age" = "age", "Female (Reference: Male)" = "sexFemale", "Non-binary (Reference: Male)" = "sexNon-binary", "Eastern Germany (Reference: Western Germany)" = "regionEastern Germany", "Trust" = "trust" ), statistics = c("N" = "nobs", "R squared" = "r.squared", "BIC") ) huxreg_table ``` --- class: center, middle .ssmall[
(1)
(2)
(3)
(4)
(Intercept)
1.770 ***
1.932 ***
-1.029 ***
-0.634 ***
(0.080)
(0.079)
(0.108)
(0.064)
Age
0.023 ***
0.023 ***
0.003
0.002
(0.001)
(0.001)
(0.002)
(0.001)
Female (Reference: Male)
-0.134 **
-0.163 ***
-0.327 ***
-0.193 ***
(0.047)
(0.047)
(0.064)
(0.038)
Non-binary (Reference: Male)
-1.735
-1.269
0.260
0.161
(1.337)
(1.305)
(1.226)
(0.749)
Eastern Germany (Reference: Western Germany)
0.418 ***
0.400 ***
-0.115
-0.067
(0.050)
(0.049)
(0.069)
(0.041)
Trust
-0.610 ***
(0.054)
N
3216
3159
5178
5178
R squared
0.113
0.146
BIC
11035.941
10689.421
5869.103
5869.125
*** p < 0.001; ** p < 0.01; * p < 0.05.
] For more details, have a look at the [huxreg vignette](https://hughjonesd.github.io/huxtable/huxreg.html). --- ## Export `huxtable` object to LaTeX ```r quick_latex(huxreg_table, file = "regression_table.tex") ``` --- ## Generating text output Instead of or in addition to tables, we often want to report the results of our statistical analysis in textual form. To save us from typing and copy-pasting (too much), the [`report` package](https://easystats.github.io/report/) from the `easystats` collection offers some convenient functions. For example, we can easily produce some template text for the t-test we computed earlier on. ```r library(report) t.test(xenophobia ~ region, data = allbus_2021_cda) %>% report() ``` ``` ## Effect sizes were labelled following Cohen's (1988) recommendations. ## ## The Welch Two Sample t-test testing the difference of xenophobia by region ## (mean in group Western Germany = 2.93, mean in group Eastern Germany = 3.42) ## suggests that the effect is negative, statistically significant, and small ## (difference = -0.49, 95% CI [-0.60, -0.38], t(1947.89) = -8.97, p < .001; ## Cohen's d = -0.41, 95% CI [-0.50, -0.32]) ``` .small[ *Note*: While `report` is format-agnostic as it produces plain-text output, a nice tool for getting your output from `R` into *Microsoft Word* is the [`tidystats` Word add-in](https://www.tidystats.io/word-add-in.html). ] --- ## Generating text output We can do the same for the ANOVA... ```r anova %>% report() ``` ``` ## The ANOVA (formula: xenophobia ~ party) suggests that: ## ## - The main effect of party is statistically significant and large (F(7, 2459) = ## 103.75, p < .001; Eta2 = 0.23, 95% CI [0.20, 1.00]) ## ## Effect sizes were labelled following Field's (2013) recommendations. ``` --- ## Generating text output ... or our regression models. ```r simple_model_logistic %>% report() ``` .right[↪️] --- class: center, middle .tinyish[ ``` ## We fitted a logistic model (estimated using ML) to predict trust with age, sex, ## region, contact and party ## (formula: trust ~ age + sex + region + contact + party). The model's ## explanatory power is weak (Tjur's R2 = 0.04). The model's intercept, ## corresponding to age = 0, sex = Male, region = Western Germany, contact = 0 and ## party = CDU-CSU ## , is at -0.73 (95% CI [-1.28, -0.18], p = 0.010). Within this model: ## ## - The effect of age is statistically significant and positive (beta = 6.06e-03, ## 95% CI [5.08e-05, 0.01], p = 0.049; Std. beta = 0.11, 95% CI [8.86e-04, 0.21]) ## - The effect of sex [Female] is statistically significant and negative (beta = ## -0.39, 95% CI [-0.58, -0.20], p < .001; Std. beta = -0.39, 95% CI [-0.58, ## -0.20]) ## - The effect of sex [Non-binary] is statistically non-significant and positive ## (beta = 13.12, 95% CI [-53.06, ], p = 0.968; Std. beta = 13.12, 95% CI [-53.06, ## ]) ## - The effect of region [Eastern Germany] is statistically non-significant and ## positive (beta = 0.06, 95% CI [-0.17, 0.28], p = 0.604; Std. beta = 0.06, 95% ## CI [-0.17, 0.28]) ## - The effect of contact is statistically non-significant and negative (beta = ## -0.08, 95% CI [-0.16, 3.18e-03], p = 0.060; Std. beta = -0.10, 95% CI [-0.21, ## 4.14e-03]) ## - The effect of party [2] is statistically non-significant and positive (beta = ## 5.66e-03, 95% CI [-0.31, 0.31], p = 0.971; Std. beta = 5.66e-03, 95% CI [-0.31, ## 0.31]) ## - The effect of party [3] is statistically non-significant and positive (beta = ## 0.12, 95% CI [-0.22, 0.44], p = 0.494; Std. beta = 0.12, 95% CI [-0.22, 0.44]) ## - The effect of party [4] is statistically significant and positive (beta = ## 0.57, 95% CI [0.30, 0.85], p < .001; Std. beta = 0.57, 95% CI [0.30, 0.85]) ## - The effect of party [5] is statistically non-significant and positive (beta = ## 0.33, 95% CI [-0.07, 0.71], p = 0.103; Std. beta = 0.33, 95% CI [-0.07, 0.71]) ## - The effect of party [6] is statistically significant and negative (beta = ## -0.95, 95% CI [-1.50, -0.45], p < .001; Std. beta = -0.95, 95% CI [-1.50, ## -0.45]) ## - The effect of party [7] is statistically non-significant and negative (beta = ## -0.10, 95% CI [-0.64, 0.41], p = 0.710; Std. beta = -0.10, 95% CI [-0.64, ## 0.41]) ## - The effect of party [8] is statistically significant and negative (beta = ## -1.54, 95% CI [-2.36, -0.85], p < .001; Std. beta = -1.54, 95% CI [-2.36, ## -0.85]) ## ## Standardized parameters were obtained by fitting the model on a standardized ## version of the dataset. 95% Confidence Intervals (CIs) and p-values were ## computed using a Wald z-distribution approximation. ``` ] --- ## tidy models with `broom` .pull-left[ We have already entered the area of reporting statistical results. We will have a separate session on reporting with `R Markdown` tomorrow. One thing to note at this point is that more and more developers in `R` were unsatisfied with the diverse output some of the standard regression procedures provide. The outputs may be helpful to look at, but they're usually not great for further processing. For that purpose, we need data frames/tibbles. ] .pull-right[ <img src="data:image/png;base64,#../img/broom.png" width="70%" style="display: block; margin: auto;" /> ] --- ## 3 functions of `broom` The [`broom`](https://broom.tidymodels.org/) package provides only 3 but very powerful main functions: - `tidy()`: creates a `tibble` from your model - `glance()`: information about your model as `tibble` ('model fit') - `augment()`: adds information, e.g., individual fitted values to your data *Note*: With `broom` you can also create a standardized output of other types of models, such as Latent Class Analysis (LCA) (with the package [`poLCA`](https://cran.r-project.org/web/packages/poLCA/index.html)). --- ## `tidy()` ```r library(broom) tidy(simple_linear_model) ```
term
estimate
std.error
statistic
p.value
(Intercept)
1.07
0.141
7.6
4.53e-14
age
0.0172
0.00152
11.3
5.67e-29
sexFemale
-0.0924
0.0493
-1.87
0.0611
sexNon-binary
-0.671
1.13
-0.595
0.552
regionEastern Germany
0.0453
0.0565
0.802
0.423
trust
-0.359
0.0554
-6.47
1.22e-10
contact
0.202
0.0213
9.53
4.29e-21
partySPD
-0.31
0.0787
-3.94
8.44e-05
partyFDP
0.165
0.0849
1.94
0.0527
partyGruene
-0.725
0.0724
-10
4.13e-23
partyLinke
-0.574
0.104
-5.53
3.55e-08
partyAfD
1.63
0.106
15.3
4.26e-50
partyOther party
0.205
0.129
1.58
0.114
partyWould not vote
0.432
0.118
3.65
0.000269
--- ## `glance()` ```r glance(simple_linear_model) ```
r.squared
adj.r.squared
sigma
statistic
p.value
df
logLik
AIC
BIC
deviance
df.residual
nobs
0.356
0.352
1.12
90.5
2.6e-192
13
-3.28e+03
6.59e+03
6.68e+03
2.68e+03
2127
2141
--- ## `augment()` ```r augment(simple_linear_model) ```
.rownames
xenophobia
age
sex
region
trust
contact
party
.fitted
.resid
.hat
.sigma
.cooksd
.std.resid
2
2
53
Male
Western Germany
1
6
CDU-CSU
2.84
-0.838
0.00389
1.12
0.000156
-0.747
7
1.5
31
Female
Western Germany
0
4
Gruene
1.6
-0.095
0.00375
1.12
1.93e-06
-0.0847
9
3.75
68
Male
Eastern Germany
0
8
Linke
3.33
0.419
0.00838
1.12
8.45e-05
0.374
17
2.5
54
Male
Western Germany
0
5
SPD
2.7
-0.201
0.00407
1.12
9.4e-06
-0.18
18
2
45
Male
Western Germany
0
5
Gruene
2.13
-0.131
0.00313
1.12
3.07e-06
-0.117
19
2
49
Male
Western Germany
0
4
Gruene
2
0.00223
0.00388
1.12
1.1e-09
0.00199
20
2
26
Male
Western Germany
1
5
Gruene
1.45
0.555
0.00417
1.12
7.33e-05
0.495
21
3.25
83
Female
Western Germany
0
6
CDU-CSU
3.62
-0.371
0.00399
1.12
3.14e-05
-0.331
24
2.25
73
Female
Eastern Germany
0
7
SPD
3.39
-1.14
0.005
1.12
0.000369
-1.01
25
5
62
Male
Eastern Germany
0
7
AfD
5.23
-0.227
0.00761
1.12
2.25e-05
-0.203
27
1.5
54
Male
Eastern Germany
0
5
CDU-CSU
3.06
-1.56
0.0047
1.12
0.000651
-1.39
29
4.75
51
Male
Eastern Germany
0
7
AfD
5.04
-0.287
0.00752
1.12
3.57e-05
-0.257
31
2.5
49
Male
Western Germany
0
4
SPD
2.41
0.0874
0.00487
1.12
2.13e-06
0.078
32
1.25
57
Female
Western Germany
0
4
SPD
2.46
-1.21
0.00514
1.12
0.000429
-1.08
35
1.5
39
Female
Western Germany
0
5
AfD
4.29
-2.79
0.00868
1.12
0.00388
-2.49
36
4
82
Male
Western Germany
0
8
SPD
3.79
0.209
0.0061
1.12
1.52e-05
0.186
42
2.5
50
Female
Western Germany
0
4
AfD
4.27
-1.77
0.0097
1.12
0.00176
-1.59
44
2.25
25
Female
Western Germany
1
4
SPD
1.55
0.702
0.00733
1.12
0.000207
0.627
45
1.5
65
Male
Western Germany
1
6
Linke
2.47
-0.971
0.00898
1.12
0.000488
-0.868
47
4
72
Male
Western Germany
1
5
SPD
2.65
1.35
0.00559
1.12
0.00058
1.2
50
1.25
55
Female
Western Germany
1
6
Gruene
2.06
-0.805
0.00371
1.12
0.000137
-0.718
51
1.5
31
Male
Eastern Germany
1
8
Linke
2.33
-0.835
0.0106
1.12
0.000427
-0.747
57
2
83
Female
Western Germany
1
7
CDU-CSU
3.47
-1.47
0.00522
1.12
0.000641
-1.31
62
1.5
38
Male
Western Germany
0
5
Gruene
2.01
-0.511
0.00318
1.12
4.73e-05
-0.455
63
2.5
69
Male
Eastern Germany
1
8
SPD
3.25
-0.754
0.00627
1.12
0.000204
-0.673
65
3.25
48
Male
Western Germany
0
6
CDU-CSU
3.11
0.14
0.00298
1.12
3.31e-06
0.124
67
4.5
26
Female
Western Germany
0
5
FDP
2.6
1.9
0.00553
1.12
0.00114
1.7
70
2.25
38
Male
Eastern Germany
0
6
FDP
3.15
-0.898
0.00579
1.12
0.000267
-0.802
73
2.5
50
Male
Eastern Germany
0
6
Linke
2.62
-0.116
0.00756
1.12
5.84e-06
-0.104
74
2.5
57
Male
Eastern Germany
1
7
FDP
3.32
-0.819
0.00636
1.12
0.000245
-0.732
81
2.5
63
Female
Eastern Germany
0
5
FDP
3.28
-0.784
0.00725
1.12
0.000256
-0.7
83
3.25
77
Female
Western Germany
0
6
CDU-CSU
3.52
-0.268
0.00347
1.12
1.42e-05
-0.239
85
1.5
30
Female
Eastern Germany
1
6
Would not vote
2.83
-1.33
0.0137
1.12
0.00141
-1.19
86
2.25
58
Female
Western Germany
1
6
CDU-CSU
2.83
-0.582
0.00404
1.12
7.8e-05
-0.519
88
3
59
Male
Western Germany
0
4
CDU-CSU
2.9
0.105
0.00408
1.12
2.56e-06
0.0936
89
3.75
51
Female
Western Germany
0
5
FDP
3.03
0.718
0.00487
1.12
0.000143
0.641
90
1.75
25
Male
Eastern Germany
0
6
Gruene
2.03
-0.284
0.00512
1.12
2.36e-05
-0.254
93
2.5
65
Female
Western Germany
1
5
FDP
2.91
-0.415
0.0066
1.12
6.51e-05
-0.37
96
1
25
Female
Eastern Germany
0
6
Gruene
1.94
-0.942
0.005
1.12
0.000253
-0.84
99
2.25
46
Male
Eastern Germany
0
5
Gruene
2.19
0.0562
0.00478
1.12
8.61e-07
0.0501
101
2.5
50
Male
Western Germany
0
6
CDU-CSU
3.14
-0.645
0.00292
1.12
6.92e-05
-0.575
103
3
49
Female
Eastern Germany
0
6
Would not vote
3.51
-0.513
0.0105
1.12
0.00016
-0.459
108
4.25
60
Male
Eastern Germany
1
6
SPD
2.69
1.56
0.00579
1.12
0.000803
1.39
109
2.25
55
Female
Eastern Germany
0
8
SPD
3.28
-1.03
0.00525
1.12
0.000318
-0.918
110
2
52
Male
Western Germany
0
6
FDP
3.34
-1.34
0.00454
1.12
0.000468
-1.2
111
3
66
Female
Eastern Germany
1
8
FDP
3.58
-0.585
0.00745
1.12
0.000146
-0.522
114
3.75
71
Male
Western Germany
1
6
Gruene
2.42
1.33
0.0045
1.12
0.000452
1.18
117
4
68
Female
Western Germany
0
6
CDU-CSU
3.36
0.637
0.00295
1.12
6.82e-05
0.568
122
1.5
44
Female
Eastern Germany
1
4
Other party
2.44
-0.935
0.0166
1.12
0.000848
-0.84
125
2.5
60
Female
Eastern Germany
0
6
Linke
2.7
-0.196
0.00772
1.12
1.7e-05
-0.175
127
4.5
33
Male
Eastern Germany
0
6
SPD
2.59
1.91
0.00587
1.12
0.00123
1.71
128
2
20
Male
Western Germany
0
5
Gruene
1.7
0.3
0.00414
1.12
2.12e-05
0.267
129
1.25
79
Male
Western Germany
1
6
CDU-CSU
3.29
-2.04
0.00461
1.12
0.00109
-1.82
133
3
21
Male
Western Germany
0
8
Gruene
2.32
0.675
0.00755
1.12
0.000198
0.603
135
5
59
Female
Western Germany
0
8
Gruene
2.89
2.11
0.00475
1.12
0.00121
1.88
137
3
32
Male
Western Germany
0
6
Other party
3.04
-0.039
0.0121
1.12
1.07e-06
-0.0349
140
2.5
47
Female
Western Germany
0
4
Gruene
1.87
0.629
0.00374
1.12
8.44e-05
0.561
141
1.5
54
Female
Western Germany
0
8
Gruene
2.8
-1.3
0.00474
1.12
0.000459
-1.16
147
4
49
Male
Western Germany
0
5
Gruene
2.2
1.8
0.00318
1.12
0.000587
1.6
149
7
78
Male
Eastern Germany
0
8
AfD
5.71
1.29
0.00864
1.12
0.000834
1.16
150
1.75
54
Male
Western Germany
0
5
CDU-CSU
3.01
-1.26
0.00303
1.12
0.000275
-1.12
152
3
70
Female
Eastern Germany
0
8
CDU-CSU
3.85
-0.848
0.00405
1.12
0.000166
-0.756
157
2.75
57
Male
Western Germany
1
6
CDU-CSU
2.91
-0.157
0.00384
1.12
5.4e-06
-0.14
158
1
51
Male
Western Germany
0
6
Gruene
2.44
-1.44
0.00322
1.12
0.000379
-1.28
160
4.75
50
Male
Eastern Germany
0
6
CDU-CSU
3.19
1.56
0.00394
1.12
0.000547
1.39
164
2.25
70
Female
Western Germany
0
5
CDU-CSU
3.19
-0.945
0.00359
1.12
0.000183
-0.843
165
3.75
83
Female
Eastern Germany
0
8
CDU-CSU
4.07
-0.322
0.00461
1.12
2.73e-05
-0.287
166
5.5
59
Male
Western Germany
1
5
CDU-CSU
2.74
2.76
0.00401
1.12
0.00174
2.46
169
1.5
68
Female
Western Germany
0
4
SPD
2.65
-1.15
0.00572
1.12
0.000432
-1.02
174
1.75
58
Female
Western Germany
1
6
CDU-CSU
2.83
-1.08
0.00404
1.12
0.00027
-0.965
175
3.5
70
Male
Western Germany
0
7
CDU-CSU
3.69
-0.192
0.00345
1.12
7.26e-06
-0.171
181
4
70
Female
Western Germany
0
5
SPD
2.88
1.12
0.00465
1.12
0.00033
0.995
182
1.75
46
Male
Eastern Germany
1
8
SPD
2.86
-1.11
0.00701
1.12
0.000493
-0.989
183
4
18
Female
Eastern Germany
0
7
FDP
2.91
1.09
0.00796
1.12
0.000541
0.971
184
2
23
Female
Eastern Germany
0
5
Linke
1.86
0.144
0.00933
1.12
1.12e-05
0.129
189
1.75
40
Female
Western Germany
1
4
Gruene
1.39
0.358
0.00428
1.12
3.14e-05
0.32
193
6.75
44
Female
Western Germany
0
7
Would not vote
3.58
3.17
0.0105
1.12
0.00607
2.83
194
4.5
64
Male
Eastern Germany
0
8
FDP
4
0.499
0.00608
1.12
8.66e-05
0.445
196
4.25
64
Female
Western Germany
0
5
Gruene
2.37
1.88
0.00371
1.12
0.00075
1.68
199
2.5
58
Female
Western Germany
0
5
CDU-CSU
2.99
-0.488
0.00308
1.12
4.18e-05
-0.435
201
5
65
Male
Western Germany
0
6
CDU-CSU
3.4
1.6
0.00296
1.12
0.00043
1.42
202
4.5
49
Female
Western Germany
1
4
Gruene
1.55
2.95
0.00441
1.12
0.0022
2.63
203
3.5
46
Male
Eastern Germany
0
5
FDP
3.08
0.417
0.00626
1.12
6.23e-05
0.372
205
4.5
57
Male
Eastern Germany
1
6
SPD
2.64
1.86
0.00578
1.12
0.00114
1.66
206
1.75
55
Female
Western Germany
0
6
CDU-CSU
3.14
-1.39
0.00271
1.12
0.000298
-1.24
208
2.5
46
Male
Eastern Germany
1
5
FDP
2.72
-0.225
0.00707
1.12
2.05e-05
-0.201
209
5
60
Female
Western Germany
0
6
Would not vote
3.66
1.34
0.00996
1.12
0.00104
1.2
212
2
37
Female
Western Germany
0
5
CDU-CSU
2.63
-0.626
0.00346
1.12
7.72e-05
-0.558
216
2.75
51
Male
Eastern Germany
0
8
CDU-CSU
3.61
-0.862
0.0045
1.12
0.000191
-0.769
219
7
67
Male
Eastern Germany
0
7
CDU-CSU
3.69
3.31
0.00375
1.12
0.00235
2.96
222
5
26
Male
Western Germany
0
8
AfD
4.76
0.237
0.0111
1.12
3.58e-05
0.212
228
2.25
37
Male
Eastern Germany
1
5
Gruene
1.68
0.57
0.00519
1.12
9.64e-05
0.509
235
2.5
69
Male
Western Germany
0
6
CDU-CSU
3.47
-0.972
0.00311
1.12
0.000168
-0.867
236
3.75
54
Female
Eastern Germany
1
8
Other party
3.42
0.332
0.0147
1.12
9.44e-05
0.298
239
2.5
67
Female
Eastern Germany
1
7
FDP
3.4
-0.9
0.00712
1.12
0.000331
-0.804
243
2.5
29
Male
Western Germany
0
6
SPD
2.47
0.0273
0.00531
1.12
2.27e-07
0.0244
249
1.75
22
Male
Western Germany
0
6
Gruene
1.94
-0.187
0.00441
1.12
8.82e-06
-0.167
251
3.25
25
Male
Eastern Germany
0
6
FDP
2.92
0.326
0.00666
1.12
4.07e-05
0.291
254
1.75
37
Female
Western Germany
0
4
SPD
2.11
-0.363
0.00522
1.12
3.94e-05
-0.324
255
4
65
Female
Eastern Germany
0
7
Linke
2.98
1.02
0.00764
1.12
0.000452
0.907
259
4.75
66
Female
Western Germany
0
8
Would not vote
4.17
0.585
0.0114
1.12
0.000225
0.523
263
2.5
33
Male
Western Germany
0
5
FDP
2.81
-0.314
0.00493
1.12
2.77e-05
-0.28
264
3.5
22
Male
Western Germany
0
5
CDU-CSU
2.46
1.04
0.00476
1.12
0.000294
0.928
270
2.5
50
Male
Western Germany
0
6
CDU-CSU
3.14
-0.645
0.00292
1.12
6.92e-05
-0.575
273
2.5
37
Male
Western Germany
1
4
Gruene
1.43
1.07
0.00406
1.12
0.000264
0.952
277
3.5
71
Female
Eastern Germany
0
8
CDU-CSU
3.86
-0.365
0.00407
1.12
3.09e-05
-0.325
279
2
50
Female
Western Germany
1
5
CDU-CSU
2.49
-0.491
0.00433
1.12
5.97e-05
-0.438
282
3.5
40
Male
Western Germany
0
5
Linke
2.2
1.3
0.00809
1.12
0.000792
1.17
284
4.25
18
Female
Eastern Germany
0
6
Linke
1.97
2.28
0.00951
1.12
0.00285
2.04
286
3.5
66
Female
Western Germany
0
5
CDU-CSU
3.13
0.374
0.00336
1.12
2.68e-05
0.334
287
4.25
71
Female
Western Germany
0
8
CDU-CSU
3.82
0.43
0.00411
1.12
4.35e-05
0.384
288
5.5
79
Female
Eastern Germany
0
8
CDU-CSU
4
1.5
0.00437
1.12
0.00056
1.34
292
3.5
67
Male
Eastern Germany
0
6
SPD
3.17
0.327
0.00507
1.12
3.09e-05
0.292
294
2.5
32
Female
Western Germany
0
4
AfD
3.96
-1.46
0.00976
1.12
0.00121
-1.31
295
2.25
63
Male
Western Germany
0
8
CDU-CSU
3.77
-1.52
0.00442
1.12
0.000587
-1.36
296
1.75
58
Female
Western Germany
1
6
CDU-CSU
2.83
-1.08
0.00404
1.12
0.00027
-0.965
298
2.25
38
Female
Western Germany
0
6
CDU-CSU
2.85
-0.596
0.00334
1.12
6.75e-05
-0.531
305
3.75
56
Female
Western Germany
1
5
FDP
2.76
0.99
0.00616
1.12
0.000346
0.884
307
2.25
48
Male
Western Germany
0
5
FDP
3.07
-0.823
0.00463
1.12
0.000179
-0.734
308
2.5
62
Male
Eastern Germany
0
6
AfD
5.02
-2.52
0.00796
1.12
0.00292
-2.26
310
2
28
Female
Eastern Germany
0
5
Gruene
1.79
0.209
0.00521
1.12
1.3e-05
0.186
313
2.75
66
Female
Eastern Germany
1
8
FDP
3.58
-0.835
0.00745
1.12
0.000298
-0.746
318
3.25
19
Male
Eastern Germany
0
4
AfD
3.88
-0.628
0.011
1.12
0.000252
-0.562
322
1.75
57
Female
Western Germany
0
5
CDU-CSU
2.97
-1.22
0.00306
1.12
0.00026
-1.09
323
1.25
36
Male
Eastern Germany
0
7
Gruene
2.43
-1.18
0.00472
1.12
0.000373
-1.05
325
3
60
Female
Western Germany
0
4
SPD
2.51
0.49
0.00526
1.12
7.22e-05
0.437
329
2
29
Female
Western Germany
0
5
SPD
2.18
-0.178
0.00506
1.12
9.15e-06
-0.159
332
4.75
63
Female
Eastern Germany
0
6
Other party
3.53
1.22
0.0136
1.12
0.00118
1.1
334
2.5
26
Male
Western Germany
1
5
FDP
2.33
0.165
0.00634
1.12
9.93e-06
0.148
335
1.75
45
Female
Western Germany
1
7
Gruene
2.09
-0.335
0.00442
1.12
2.84e-05
-0.299
339
2.75
64
Female
Western Germany
0
4
Would not vote
3.32
-0.571
0.0118
1.12
0.000222
-0.511
340
4.5
92
Female
Eastern Germany
0
8
SPD
3.92
0.583
0.00648
1.12
0.000126
0.521
341
5.25
43
Female
Eastern Germany
0
7
AfD
4.81
0.443
0.00853
1.12
9.64e-05
0.396
344
2
36
Female
Eastern Germany
0
6
Gruene
2.13
-0.132
0.00432
1.12
4.27e-06
-0.117
345
2
78
Female
Eastern Germany
0
6
SPD
3.27
-1.27
0.00585
1.12
0.00054
-1.13
347
5.25
55
Female
Eastern Germany
0
8
AfD
5.22
0.0337
0.00865
1.12
5.65e-07
0.0301
348
3
54
Female
Western Germany
1
4
CDU-CSU
2.36
0.642
0.00524
1.12
0.000124
0.573
349
5
60
Female
Western Germany
0
8
CDU-CSU
3.63
1.37
0.00408
1.12
0.000437
1.22
351
1.5
36
Female
Western Germany
0
5
CDU-CSU
2.61
-1.11
0.00352
1.12
0.000246
-0.989
354
5.5
55
Male
Eastern Germany
0
7
CDU-CSU
3.48
2.02
0.00373
1.12
0.00087
1.8
355
6.5
62
Male
Eastern Germany
0
8
CDU-CSU
3.8
2.7
0.00416
1.12
0.00173
2.41
356
3
47
Male
Eastern Germany
1
6
Gruene
2.06
0.945
0.00456
1.12
0.000233
0.843
360
4.25
77
Female
Eastern Germany
0
7
CDU-CSU
3.77
0.484
0.00415
1.12
5.55e-05
0.432
361
1.5
24
Female
Western Germany
1
8
Gruene
1.93
-0.426
0.00764
1.12
7.96e-05
-0.38
362
2.75
59
Female
Eastern Germany
1
7
FDP
3.26
-0.512
0.00689
1.12
0.000103
-0.457
365
2.5
29
Male
Western Germany
0
5
Other party
2.78
-0.285
0.0121
1.12
5.71e-05
-0.255
371
3
80
Female
Eastern Germany
0
8
Linke
3.45
-0.446
0.0088
1.12
0.000101
-0.399
374
2
52
Female
Eastern Germany
1
7
Gruene
2.25
-0.251
0.00481
1.12
1.74e-05
-0.224
378
2.75
60
Female
Eastern Germany
0
5
Gruene
2.34
0.407
0.00532
1.12
5.04e-05
0.363
383
1.75
19
Female
Western Germany
0
4
Linke
1.54
0.211
0.00968
1.12
2.49e-05
0.189
385
2.5
57
Male
Western Germany
0
7
Would not vote
3.9
-1.4
0.0105
1.12
0.00119
-1.25
390
2.5
76
Female
Western Germany
1
6
SPD
2.83
-0.332
0.00571
1.12
3.61e-05
-0.297
395
2.5
71
Female
Eastern Germany
0
8
CDU-CSU
3.86
-1.36
0.00407
1.12
0.000433
-1.22
396
4.75
65
Male
Western Germany
0
8
FDP
3.97
0.777
0.00639
1.12
0.000221
0.694
398
5.5
79
Male
Western Germany
0
8
CDU-CSU
4.05
1.45
0.00477
1.12
0.000573
1.29
399
2.5
50
Female
Eastern Germany
1
8
SPD
2.83
-0.334
0.00693
1.12
4.44e-05
-0.298
401
1.25
51
Male
Western Germany
1
4
Gruene
1.67
-0.424
0.00422
1.12
4.32e-05
-0.378
402
3
84
Male
Western Germany
0
8
SPD
3.83
-0.826
0.00624
1.12
0.000244
-0.738
404
2.25
60
Female
Eastern Germany
0
8
Gruene
2.95
-0.7
0.0047
1.12
0.000132
-0.625
406
4.25
34
Male
Western Germany
0
5
FDP
2.83
1.42
0.00488
1.12
0.000562
1.27
408
3.75
79
Female
Eastern Germany
0
8
Linke
3.43
0.321
0.00873
1.12
5.19e-05
0.287
411
4
36
Female
Western Germany
0
5
FDP
2.77
1.23
0.00499
1.12
0.000429
1.09
412
2.25
26
Male
Western Germany
0
4
Gruene
1.6
0.649
0.00404
1.12
9.69e-05
0.579
418
1.75
73
Male
Western Germany
1
5
Gruene
2.26
-0.506
0.00493
1.12
7.21e-05
-0.451
419
1.25
25
Female
Western Germany
0
6
Would not vote
3.05
-1.8
0.0111
1.12
0.00209
-1.61
420
5.5
63
Male
Western Germany
1
6
CDU-CSU
3.01
2.49
0.00387
1.12
0.00137
2.22
421
6.25
78
Female
Western Germany
0
7
CDU-CSU
3.74
2.51
0.0036
1.12
0.00129
2.24
426
3.25
40
Female
Western Germany
1
4
CDU-CSU
2.12
1.13
0.00539
1.12
0.000396
1.01
427
4
32
Male
Western Germany
0
6
SPD
2.52
1.48
0.00503
1.12
0.000626
1.32
428
3.25
35
Female
Western Germany
0
6
AfD
4.42
-1.17
0.00868
1.12
0.000685
-1.05
429
3.75
70
Male
Western Germany
0
8
Gruene
3.17
0.58
0.00567
1.12
0.000109
0.518
431
4.25
70
Male
Eastern Germany
0
6
CDU-CSU
3.54
0.715
0.00419
1.12
0.000122
0.638
435
2
43
Male
Eastern Germany
1
5
Would not vote
2.94
-0.941
0.0131
1.12
0.000673
-0.843
436
1.75
22
Female
Eastern Germany
1
6
CDU-CSU
2.26
-0.506
0.00758
1.12
0.000112
-0.453
437
6
69
Male
Eastern Germany
0
8
Other party
4.13
1.87
0.0135
1.12
0.00275
1.68
440
3.75
41
Female
Western Germany
0
6
FDP
3.06
0.688
0.00475
1.12
0.000128
0.614
441
1.75
40
Female
Eastern Germany
0
7
Gruene
2.4
-0.653
0.00429
1.12
0.000104
-0.582
444
1.25
66
Male
Western Germany
1
7
SPD
2.95
-1.7
0.00548
1.12
0.000912
-1.52
448
2.5
85
Female
Eastern Germany
0
7
Linke
3.33
-0.83
0.00912
1.12
0.000362
-0.742
452
2.5
37
Female
Eastern Germany
0
6
FDP
3.04
-0.538
0.00612
1.12
0.000102
-0.481
459
6
75
Female
Eastern Germany
1
8
SPD
3.27
2.73
0.0066
1.12
0.00283
2.44
464
4.25
65
Male
Western Germany
0
5
SPD
2.89
1.36
0.00435
1.12
0.000459
1.21
468
2.75
30
Female
Western Germany
0
6
FDP
2.87
-0.122
0.00532
1.12
4.55e-06
-0.109
471
4.75
65
Female
Western Germany
0
6
CDU-CSU
3.31
1.44
0.00284
1.12
0.000335
1.28
475
2.5
39
Male
Eastern Germany
0
6
Other party
3.21
-0.705
0.0125
1.12
0.00036
-0.631
477
5.5
31
Female
Western Germany
0
4
Would not vote
2.75
2.75
0.0112
1.12
0.00491
2.46
478
2.5
69
Female
Western Germany
0
4
Would not vote
3.41
-0.907
0.0122
1.12
0.000582
-0.813
480
3.75
44
Male
Western Germany
0
5
CDU-CSU
2.84
0.911
0.00317
1.12
0.00015
0.812
481
2.5
64
Female
Western Germany
0
8
SPD
3.39
-0.889
0.00521
1.12
0.000235
-0.793
482
3.75
78
Male
Western Germany
1
8
FDP
3.84
-0.0887
0.00794
1.12
3.6e-06
-0.0793
483
3.25
32
Male
Western Germany
1
7
Gruene
1.95
1.3
0.00525
1.12
0.000505
1.16
486
1
41
Female
Western Germany
0
4
Gruene
1.77
-0.767
0.00363
1.12
0.000122
-0.684
487
1.25
63
Male
Western Germany
1
5
SPD
2.5
-1.25
0.00514
1.12
0.000458
-1.11
488
4.5
70
Female
Western Germany
0
4
CDU-CSU
2.99
1.51
0.00486
1.12
0.000631
1.35
490
4
65
Female
Western Germany
0
5
CDU-CSU
3.11
0.891
0.00331
1.12
0.00015
0.795
493
2
46
Female
Eastern Germany
1
7
Linke
2.3
-0.299
0.00866
1.12
4.45e-05
-0.267
495
3
68
Male
Western Germany
1
6
Other party
3.3
-0.301
0.0139
1.12
7.35e-05
-0.27
499
2
59
Male
Eastern Germany
0
6
CDU-CSU
3.35
-1.35
0.00387
1.12
0.000399
-1.2
504
2.5
77
Female
Western Germany
0
5
FDP
3.48
-0.98
0.00661
1.12
0.000364
-0.875
505
2
53
Male
Eastern Germany
1
7
Linke
2.51
-0.512
0.00828
1.12
0.000125
-0.457
507
1.5
36
Female
Eastern Germany
1
6
Gruene
1.77
-0.273
0.00509
1.12
2.17e-05
-0.244
523
3.75
53
Male
Western Germany
0
5
SPD
2.68
1.07
0.00407
1.12
0.000264
0.951
524
2.5
65
Male
Western Germany
0
7
SPD
3.3
-0.796
0.00445
1.12
0.000161
-0.71
525
1.75
54
Female
Western Germany
0
6
CDU-CSU
3.12
-1.37
0.00272
1.12
0.000291
-1.22
527
3.75
24
Female
Western Germany
0
4
FDP
2.36
1.39
0.00625
1.12
0.000688
1.24
538
2
68
Female
Western Germany
1
5
Linke
2.23
-0.228
0.00958
1.12
2.86e-05
-0.204
539
3.5
61
Male
Eastern Germany
0
8
FDP
3.95
-0.449
0.00603
1.12
6.97e-05
-0.401
542
4.25
53
Female
Eastern Germany
0
8
Would not vote
3.99
0.263
0.0108
1.12
4.33e-05
0.236
543
1.25
50
Female
Western Germany
0
5
Gruene
2.13
-0.875
0.00301
1.12
0.000131
-0.78
545
2.75
51
Male
Eastern Germany
0
8
CDU-CSU
3.61
-0.862
0.0045
1.12
0.000191
-0.769
547
5
81
Female
Eastern Germany
0
8
CDU-CSU
4.04
0.963
0.00449
1.12
0.000237
0.859
550
2.5
56
Male
Eastern Germany
0
6
AfD
4.92
-2.42
0.00777
1.12
0.00262
-2.16
551
2.75
70
Male
Western Germany
0
6
SPD
3.18
-0.43
0.00424
1.12
4.47e-05
-0.383
554
2.5
62
Male
Eastern Germany
1
7
CDU-CSU
3.24
-0.741
0.00466
1.12
0.000146
-0.661
557
2.75
57
Female
Western Germany
0
4
CDU-CSU
2.77
-0.0182
0.00413
1.12
7.81e-08
-0.0162
558
2.5
33
Female
Western Germany
0
6
FDP
2.92
-0.424
0.00512
1.12
5.26e-05
-0.378
560
1
32
Female
Eastern Germany
1
6
Gruene
1.7
-0.704
0.00531
1.12
0.000151
-0.628
561
2
60
Female
Western Germany
1
6
FDP
3.03
-1.03
0.006
1.12
0.000365
-0.92
562
5.75
85
Male
Eastern Germany
0
7
Linke
3.42
2.33
0.00921
1.12
0.00288
2.08
563
3.5
64
Male
Western Germany
0
5
SPD
2.87
0.626
0.00431
1.12
9.64e-05
0.559
565
2.75
32
Male
Western Germany
1
5
Linke
1.7
1.05
0.00914
1.12
0.000582
0.94
568
1.75
44
Male
Western Germany
0
5
FDP
3
-1.25
0.00463
1.12
0.000415
-1.12
569
5.5
63
Female
Western Germany
0
5
Other party
3.28
2.22
0.0132
1.12
0.0038
1.99
573
2.5
54
Female
Western Germany
0
6
Linke
2.55
-0.0472
0.0078
1.12
9.99e-07
-0.0422
574
1.75
59
Male
Eastern Germany
1
6
CDU-CSU
2.99
-1.24
0.00479
1.12
0.000418
-1.1
577
3.5
42
Male
Western Germany
1
4
FDP
2.41
1.09
0.00618
1.12
0.000422
0.975
578
1.25
33
Male
Western Germany
0
5
Linke
2.08
-0.825
0.00836
1.12
0.000327
-0.737
580
2.5
61
Female
Western Germany
1
4
SPD
2.17
0.331
0.00645
1.12
4.06e-05
0.296
583
3.75
58
Male
Eastern Germany
0
6
Would not vote
3.76
-0.0102
0.0105
1.12
6.33e-08
-0.00914
586
1.25
45
Male
Western Germany
0
5
SPD
2.55
-1.3
0.00417
1.12
0.0004
-1.16
587
2
62
Male
Eastern Germany
0
5
SPD
2.88
-0.885
0.00583
1.12
0.000261
-0.79
588
1
42
Female
Western Germany
0
5
CDU-CSU
2.71
-1.71
0.00322
1.12
0.000538
-1.53
590
2
26
Male
Western Germany
0
5
Gruene
1.8
0.196
0.00369
1.12
8.11e-06
0.175
592
2.25
55
Male
Western Germany
0
4
CDU-CSU
2.83
-0.576
0.00395
1.12
7.48e-05
-0.514
593
3.75
34
Male
Western Germany
0
5
CDU-CSU
2.67
1.08
0.00367
1.12
0.000246
0.966
594
1
27
Female
Western Germany
0
5
Linke
1.88
-0.879
0.00861
1.12
0.000383
-0.786
597
5.5
68
Male
Western Germany
1
8
CDU-CSU
3.5
2
0.00552
1.12
0.00126
1.78
598
4.5
28
Female
Western Germany
0
5
CDU-CSU
2.47
2.03
0.00412
1.12
0.000967
1.81
600
2.25
42
Female
Western Germany
1
5
Gruene
1.63
0.621
0.00365
1.12
8.03e-05
0.554
604
2.75
59
Female
Eastern Germany
0
7
FDP
3.62
-0.87
0.00567
1.12
0.000246
-0.777
605
2.75
63
Female
Western Germany
0
7
SPD
3.17
-0.419
0.00418
1.12
4.19e-05
-0.374
606
1.5
21
Female
Eastern Germany
1
5
Gruene
1.31
0.188
0.00646
1.12
1.31e-05
0.168
607
2.25
57
Female
Western Germany
0
4
CDU-CSU
2.77
-0.518
0.00413
1.12
6.33e-05
-0.462
608
3
69
Male
Western Germany
0
8
CDU-CSU
3.88
-0.877
0.00444
1.12
0.000195
-0.783
612
1
38
Male
Western Germany
1
5
Gruene
1.65
-0.652
0.0036
1.12
8.72e-05
-0.581
615
1.5
45
Non-binary
Eastern Germany
1
6
Linke
1.5
2.26e-14
1
1.12
NaN
NaN
619
7
41
Female
Western Germany
0
8
AfD
4.93
2.07
0.0101
1.12
0.0025
1.85
620
2.5
36
Male
Western Germany
0
4
Other party
2.7
-0.203
0.0126
1.12
3.02e-05
-0.182
627
3
33
Male
Western Germany
0
5
Would not vote
3.08
-0.0813
0.0104
1.12
4e-06
-0.0728
629
4.5
33
Female
Eastern Germany
0
8
CDU-CSU
3.21
1.29
0.00583
1.12
0.000556
1.15
630
3.25
62
Male
Eastern Germany
0
4
CDU-CSU
2.99
0.258
0.00653
1.12
2.49e-05
0.23
632
3
47
Female
Western Germany
1
4
Gruene
1.51
1.49
0.00436
1.12
0.00055
1.33
636
2.5
56
Male
Western Germany
0
5
CDU-CSU
3.05
-0.546
0.00305
1.12
5.18e-05
-0.487
637
2.75
39
Male
Western Germany
0
5
CDU-CSU
2.75
-0.0027
0.00337
1.12
1.4e-09
-0.0024
638
3.75
68
Female
Western Germany
0
7
CDU-CSU
3.57
0.185
0.00315
1.12
6.11e-06
0.165
639
1.25
44
Female
Western Germany
0
6
Gruene
2.22
-0.974
0.0029
1.12
0.000156
-0.868
641
2.75
60
Male
Western Germany
0
6
FDP
3.48
-0.732
0.00471
1.12
0.000144
-0.653
643
3.75
22
Female
Eastern Germany
0
6
AfD
4.24
-0.492
0.0101
1.12
0.000141
-0.44
650
4.75
86
Female
Eastern Germany
0
8
SPD
3.81
0.937
0.00594
1.12
0.000298
0.836
651
4
53
Male
Eastern Germany
1
6
CDU-CSU
2.88
1.12
0.00483
1.12
0.000344
0.996
653
3
76
Male
Eastern Germany
0
6
Other party
3.84
-0.843
0.0143
1.12
0.000593
-0.756
654
5
20
Female
Western Germany
0
8
CDU-CSU
2.94
2.06
0.00773
1.12
0.00188
1.84
658
4.5
58
Male
Eastern Germany
0
8
SPD
3.42
1.08
0.00531
1.12
0.000352
0.961
659
3.25
48
Female
Western Germany
0
5
Gruene
2.09
1.16
0.00296
1.12
0.000227
1.03
660
2
31
Female
Eastern Germany
0
6
Gruene
2.05
-0.0453
0.00458
1.12
5.36e-07
-0.0404
662
1.25
42
Female
Western Germany
1
5
Gruene
1.63
-0.379
0.00365
1.12
2.98e-05
-0.338
663
1
66
Female
Eastern Germany
1
4
Gruene
1.89
-0.885
0.00792
1.12
0.000357
-0.791
665
3
78
Male
Western Germany
1
7
SPD
3.16
-0.162
0.00591
1.12
8.83e-06
-0.144
666
7
59
Male
Eastern Germany
0
8
AfD
5.38
1.62
0.00795
1.12
0.0012
1.45
669
4
37
Female
Eastern Germany
0
7
CDU-CSU
3.08
0.924
0.00466
1.12
0.000227
0.824
672
2.25
40
Female
Eastern Germany
0
6
Linke
2.35
-0.101
0.00777
1.12
4.57e-06
-0.0904
674
6
55
Female
Eastern Germany
0
6
SPD
2.87
3.13
0.00498
1.12
0.00278
2.79
675
3
72
Female
Western Germany
0
6
CDU-CSU
3.43
-0.432
0.00315
1.12
3.34e-05
-0.385
676
6
61
Male
Eastern Germany
1
8
AfD
5.05
0.946
0.00975
1.12
0.000504
0.846
677
1
27
Female
Western Germany
1
5
Would not vote
2.53
-1.53
0.0132
1.12
0.00179
-1.37
678
4.75
81
Female
Eastern Germany
1
8
SPD
3.37
1.38
0.00686
1.12
0.000752
1.23
681
1
57
Female
Eastern Germany
1
5
Linke
2.08
-1.08
0.00937
1.12
0.000634
-0.969
683
2
53
Male
Western Germany
0
5
Gruene
2.27
-0.269
0.00329
1.12
1.36e-05
-0.24
684
3.75
53
Female
Western Germany
0
5
AfD
4.53
-0.779
0.00868
1.12
0.000303
-0.696
686
3
57
Female
Western Germany
0
4
CDU-CSU
2.77
0.232
0.00413
1.12
1.27e-05
0.207
688
2.5
26
Female
Eastern Germany
0
8
Other party
3.29
-0.793
0.0144
1.12
0.000527
-0.711
691
5.25
68
Male
Eastern Germany
0
8
SPD
3.6
1.65
0.00524
1.12
0.000821
1.48
692
5.5
65
Male
Eastern Germany
0
8
AfD
5.48
0.0189
0.00802
1.12
1.64e-07
0.0169
702
4
74
Male
Western Germany
0
8
CDU-CSU
3.96
0.0364
0.00456
1.12
3.45e-07
0.0324
707
1.75
24
Female
Western Germany
0
8
SPD
2.7
-0.949
0.00824
1.12
0.000427
-0.848
709
2.5
54
Female
Western Germany
0
8
CDU-CSU
3.53
-1.03
0.00426
1.12
0.000256
-0.916
713
2.75
78
Female
Western Germany
0
7
FDP
3.9
-1.15
0.0061
1.12
0.000464
-1.03
716
2.25
65
Male
Western Germany
1
7
Gruene
2.52
-0.273
0.00466
1.12
1.98e-05
-0.243
719
2.75
35
Female
Western Germany
1
5
SPD
1.92
0.827
0.00599
1.12
0.000235
0.739
720
2.75
19
Male
Western Germany
0
6
FDP
2.77
-0.0249
0.0063
1.12
2.25e-07
-0.0223
721
2.25
46
Female
Western Germany
0
6
SPD
2.67
-0.423
0.00399
1.12
4.08e-05
-0.378
723
2
26
Male
Western Germany
0
4
Other party
2.53
-0.531
0.0128
1.12
0.000209
-0.475
724
2
56
Female
Eastern Germany
0
5
Would not vote
3.43
-1.43
0.0116
1.12
0.00137
-1.28
729
2.25
24
Male
Western Germany
0
5
Linke
1.92
0.33
0.00897
1.12
5.63e-05
0.295
730
1.5
19
Female
Western Germany
0
5
Linke
1.74
-0.241
0.0093
1.12
3.12e-05
-0.216
732
1.5
37
Female
Western Germany
1
4
Gruene
1.34
0.16
0.00431
1.12
6.3e-06
0.143
737
2
46
Male
Eastern Germany
0
6
FDP
3.29
-1.29
0.00555
1.12
0.000526
-1.15
742
3.5
45
Female
Western Germany
0
4
FDP
2.73
0.774
0.0057
1.12
0.000196
0.691
743
4.25
52
Male
Western Germany
0
7
Gruene
2.66
1.59
0.00393
1.12
0.000569
1.42
744
4.5
62
Female
Eastern Germany
1
8
CDU-CSU
3.35
1.15
0.0054
1.12
0.000408
1.03
745
1.25
45
Female
Western Germany
0
5
Linke
2.19
-0.94
0.0079
1.12
0.000401
-0.84
746
1
54
Male
Eastern Germany
0
4
Gruene
2.13
-1.13
0.00639
1.12
0.000467
-1.01
747
2.5
35
Male
Western Germany
1
4
Gruene
1.4
1.1
0.0041
1.12
0.000284
0.983
751
2.5
38
Male
Eastern Germany
0
7
FDP
3.35
-0.85
0.00591
1.12
0.000245
-0.759
752
2.75
24
Female
Western Germany
0
5
Gruene
1.68
1.07
0.0036
1.12
0.000237
0.957
753
1
57
Male
Western Germany
1
5
FDP
2.87
-1.87
0.00565
1.12
0.00113
-1.67
754
7
84
Female
Eastern Germany
0
8
CDU-CSU
4.09
2.91
0.00468
1.12
0.00227
2.6
755
1.25
35
Male
Western Germany
0
4
Would not vote
2.91
-1.66
0.011
1.12
0.00176
-1.49
758
5
58
Male
Western Germany
1
5
FDP
2.89
2.11
0.00569
1.12
0.00146
1.89
760
3.25
66
Male
Western Germany
0
5
AfD
4.85
-1.6
0.00848
1.12
0.00124
-1.43
763
1.5
63
Male
Western Germany
0
7
Gruene
2.85
-1.35
0.00416
1.12
0.00043
-1.2
766
2.25
58
Female
Western Germany
0
6
Would not vote
3.62
-1.37
0.0099
1.12
0.00108
-1.23
767
2.25
37
Female
Western Germany
0
5
Gruene
1.9
0.349
0.003
1.12
2.08e-05
0.311
769
2.5
52
Female
Western Germany
1
5
Gruene
1.8
0.699
0.00373
1.12
0.000104
0.623
771
2.5
24
Female
Western Germany
0
4
SPD
1.89
0.611
0.00606
1.12
0.00013
0.545
773
4
73
Male
Western Germany
0
8
Would not vote
4.38
-0.379
0.012
1.12
9.93e-05
-0.339
775
2.25
48
Female
Western Germany
0
5
FDP
2.98
-0.73
0.00483
1.12
0.000147
-0.651
776
1.5
56
Female
Western Germany
0
4
Gruene
2.03
-0.526
0.00415
1.12
6.55e-05
-0.469
777
2
61
Male
Eastern Germany
0
6
SPD
3.07
-1.07
0.0049
1.12
0.00032
-0.955
778
2.75
31
Female
Eastern Germany
0
6
CDU-CSU
2.77
-0.0202
0.00514
1.12
1.19e-07
-0.018
782
2.75
57
Male
Western Germany
0
5
SPD
2.75
-0.00298
0.0041
1.12
2.09e-09
-0.00266
788
2.25
29
Male
Western Germany
0
4
SPD
2.07
0.182
0.00556
1.12
1.06e-05
0.163
789
2.5
58
Male
Eastern Germany
1
5
CDU-CSU
2.77
-0.267
0.0056
1.12
2.29e-05
-0.238
793
1
31
Male
Western Germany
1
5
Gruene
1.53
-0.531
0.00387
1.12
6.23e-05
-0.474
795
7
64
Female
Eastern Germany
0
8
AfD
5.37
1.63
0.00869
1.12
0.00133
1.46
799
3.75
27
Male
Western Germany
0
8
FDP
3.32
0.432
0.00811
1.12
8.72e-05
0.386
805
6
83
Male
Western Germany
1
8
CDU-CSU
3.76
2.24
0.00601
1.12
0.00173
2
809
3.25
67
Female
Western Germany
0
6
Gruene
2.62
0.629
0.00358
1.12
8.07e-05
0.561
813
2.5
34
Female
Western Germany
1
5
Gruene
1.49
1.01
0.00385
1.12
0.000224
0.9
814
4.75
70
Male
Western Germany
0
6
Gruene
2.76
1.99
0.00411
1.12
0.000925
1.77
815
2.5
59
Male
Western Germany
1
5
Linke
2.16
0.335
0.00884
1.12
5.72e-05
0.3
817
3
56
Male
Eastern Germany
1
7
CDU-CSU
3.14
-0.138
0.00473
1.12
5.11e-06
-0.123
819
3
70
Male
Western Germany
1
8
FDP
3.7
-0.701
0.00753
1.12
0.000212
-0.626
822
1.25
46
Female
Eastern Germany
0
8
FDP
3.6
-2.35
0.00633
1.12
0.002
-2.1
824
2
37
Male
Eastern Germany
0
7
Linke
2.59
-0.594
0.00817
1.12
0.000166
-0.531
825
3.5
87
Male
Western Germany
1
7
SPD
3.32
0.183
0.00657
1.12
1.27e-05
0.164
829
1.75
44
Female
Western Germany
0
5
SPD
2.44
-0.686
0.0042
1.12
0.000113
-0.612
835
3.25
46
Female
Western Germany
0
6
FDP
3.15
0.102
0.00463
1.12
2.74e-06
0.0909
836
3.25
49
Female
Western Germany
0
7
CDU-CSU
3.24
0.0123
0.0033
1.12
2.84e-08
0.011
837
1.25
33
Male
Western Germany
1
5
Linke
1.72
-0.467
0.00908
1.12
0.000114
-0.417
839
2.5
70
Female
Western Germany
0
7
SPD
3.29
-0.79
0.00434
1.12
0.000154
-0.704
840
2.5
37
Male
Western Germany
0
4
CDU-CSU
2.52
-0.0157
0.00412
1.12
5.81e-08
-0.014
842
1
26
Male
Western Germany
1
7
Linke
2
-1
0.0112
1.12
0.000647
-0.896
845
1.25
24
Male
Western Germany
0
4
Gruene
1.57
-0.317
0.00414
1.12
2.37e-05
-0.282
846
3
58
Female
Western Germany
1
5
SPD
2.32
0.681
0.00537
1.12
0.000142
0.608
851
2.25
62
Male
Western Germany
1
8
Gruene
2.67
-0.423
0.00589
1.12
6.04e-05
-0.378
852
2.25
26
Male
Western Germany
0
7
Other party
3.14
-0.888
0.0133
1.12
0.000612
-0.796
853
2.25
33
Male
Eastern Germany
1
5
SPD
2.03
0.224
0.00732
1.12
2.11e-05
0.2
854
2.25
67
Female
Western Germany
1
6
Linke
2.41
-0.163
0.0092
1.12
1.41e-05
-0.146
860
5
53
Male
Eastern Germany
0
8
FDP
3.81
1.19
0.00606
1.12
0.000491
1.06
867
1.25
56
Female
Western Germany
0
6
Gruene
2.43
-1.18
0.00301
1.12
0.000239
-1.05
868
2.75
28
Male
Western Germany
0
5
SPD
2.25
0.497
0.00517
1.12
7.3e-05
0.444
871
2.75
27
Male
Western Germany
0
6
FDP
2.91
-0.163
0.00551
1.12
8.36e-06
-0.145
874
3
61
Female
Western Germany
1
4
Gruene
1.75
1.25
0.00504
1.12
0.000447
1.11
875
3
47
Female
Western Germany
1
6
Gruene
1.92
1.08
0.00365
1.12
0.000244
0.965
877
2
67
Female
Western Germany
0
7
CDU-CSU
3.55
-1.55
0.00312
1.12
0.000426
-1.38
879
1
45
Female
Western Germany
1
7
FDP
2.97
-1.97
0.00656
1.12
0.00147
-1.76
880
2.25
33
Female
Western Germany
0
5
SPD
2.25
0.00323
0.00475
1.12
2.82e-09
0.00288
885
3.75
73
Female
Western Germany
0
8
FDP
4.02
-0.269
0.00654
1.12
2.71e-05
-0.24
886
4.75
72
Female
Western Germany
0
4
Would not vote
3.46
1.29
0.0125
1.12
0.00121
1.16
887
3
58
Female
Western Germany
0
8
Other party
3.8
-0.8
0.0137
1.12
0.00051
-0.717
889
1.25
30
Male
Western Germany
1
7
Gruene
1.92
-0.669
0.00542
1.12
0.000139
-0.597
891
1.25
26
Male
Western Germany
1
5
Linke
1.6
-0.346
0.00957
1.12
6.6e-05
-0.309
894
3.25
46
Male
Western Germany
1
4
CDU-CSU
2.31
0.938
0.00479
1.12
0.000241
0.837
898
4
23
Male
Western Germany
0
6
FDP
2.84
1.16
0.00588
1.12
0.00045
1.03
900
4
57
Female
Eastern Germany
0
8
Gruene
2.9
1.1
0.00466
1.12
0.000323
0.983
905
5.25
46
Male
Western Germany
0
5
CDU-CSU
2.87
2.38
0.00311
1.12
0.001
2.12
906
1
56
Female
Western Germany
0
6
CDU-CSU
3.16
-2.16
0.00271
1.12
0.000717
-1.92
909
5.5
40
Male
Western Germany
0
5
CDU-CSU
2.77
2.73
0.00333
1.12
0.00141
2.43
912
4
56
Male
Western Germany
0
5
CDU-CSU
3.05
0.954
0.00305
1.12
0.000158
0.851
914
2.5
38
Female
Western Germany
0
5
FDP
2.81
-0.308
0.00492
1.12
2.66e-05
-0.275
915
2.75
20
Male
Western Germany
0
4
Gruene
1.5
1.25
0.0044
1.12
0.000394
1.12
916
2.25
42
Male
Western Germany
0
6
Gruene
2.28
-0.032
0.00326
1.12
1.91e-07
-0.0286
917
1.75
52
Male
Western Germany
0
6
Gruene
2.45
-0.704
0.00324
1.12
9.15e-05
-0.628
920
2.75
64
Male
Western Germany
0
5
SPD
2.87
-0.124
0.00431
1.12
3.76e-06
-0.11
921
1.5
46
Male
Eastern Germany
1
6
Gruene
2.04
-0.538
0.00457
1.12
7.56e-05
-0.48
922
4
40
Male
Western Germany
1
5
FDP
2.58
1.42
0.00559
1.12
0.000649
1.27
925
2.75
54
Female
Eastern Germany
1
7
Linke
2.44
0.313
0.00847
1.12
4.79e-05
0.28
926
2.5
59
Female
Western Germany
0
5
Gruene
2.28
0.22
0.00338
1.12
9.29e-06
0.196
932
1.25
48
Female
Western Germany
1
7
Gruene
2.14
-0.887
0.00435
1.12
0.000195
-0.791
936
4
59
Female
Eastern Germany
0
6
AfD
4.88
-0.88
0.00878
1.12
0.000392
-0.787
938
3.5
46
Male
Western Germany
0
4
Would not vote
3.1
0.397
0.0108
1.12
9.89e-05
0.355
940
1.5
51
Male
Eastern Germany
1
5
Linke
2.07
-0.572
0.00878
1.12
0.000166
-0.512
941
3.75
66
Female
Western Germany
1
6
FDP
3.13
0.616
0.00625
1.12
0.000136
0.55
944
3
25
Female
Western Germany
0
5
CDU-CSU
2.42
0.581
0.0044
1.12
8.49e-05
0.518
945
2.75
76
Male
Western Germany
0
6
Gruene
2.87
-0.118
0.00467
1.12
3.73e-06
-0.106
955
2.5
63
Female
Western Germany
0
7
Other party
3.68
-1.18
0.0129
1.12
0.00105
-1.06
958
3
60
Male
Eastern Germany
0
6
SPD
3.05
-0.0525
0.00488
1.12
7.7e-07
-0.0469
962
2.5
33
Female
Western Germany
0
4
Other party
2.56
-0.0589
0.0131
1.12
2.64e-06
-0.0528
963
4.5
59
Male
Eastern Germany
1
8
Other party
3.6
0.904
0.0142
1.12
0.000676
0.81
968
2.25
71
Male
Western Germany
0
5
SPD
2.99
-0.744
0.00469
1.12
0.000149
-0.664
969
3.5
66
Male
Eastern Germany
0
8
Would not vote
4.3
-0.803
0.0109
1.12
0.000407
-0.719
970
3.25
45
Male
Western Germany
0
6
Would not vote
3.49
-0.241
0.01
1.12
3.35e-05
-0.215
973
2.25
69
Male
Eastern Germany
0
8
Gruene
3.2
-0.948
0.00533
1.12
0.000274
-0.846
975
2.75
44
Male
Western Germany
1
6
Gruene
1.96
0.792
0.00368
1.12
0.000132
0.706
978
2.5
39
Female
Western Germany
0
4
CDU-CSU
2.46
0.0422
0.00415
1.12
4.21e-07
0.0376
979
1.75
61
Female
Western Germany
0
7
Gruene
2.72
-0.97
0.00364
1.12
0.000195
-0.865
980
3.5
87
Male
Western Germany
0
4
SPD
3.07
0.432
0.0076
1.12
8.16e-05
0.386
982
7
74
Female
Western Germany
0
7
FDP
3.83
3.17
0.00578
1.12
0.00332
2.83
983
4.5
40
Male
Western Germany
0
7
AfD
4.8
-0.302
0.00839
1.12
4.41e-05
-0.27
984
2.25
70
Female
Western Germany
0
7
SPD
3.29
-1.04
0.00434
1.12
0.000268
-0.927
987
2.5
85
Female
Western Germany
0
7
CDU-CSU
3.86
-1.36
0.00413
1.12
0.000435
-1.21
989
2
36
Male
Western Germany
0
5
Gruene
1.98
0.0239
0.00323
1.12
1.05e-07
0.0213
990
2.5
63
Female
Western Germany
1
4
Gruene
1.79
0.712
0.00519
1.12
0.00015
0.635
991
5.25
88
Female
Western Germany
0
7
CDU-CSU
3.91
1.34
0.00441
1.12
0.000452
1.2
992
4.25
50
Male
Western Germany
0
5
AfD
4.57
-0.32
0.0078
1.12
4.58e-05
-0.286
995
2
46
Male
Western Germany
1
4
CDU-CSU
2.31
-0.312
0.00479
1.12
2.67e-05
-0.279
998
2
28
Male
Western Germany
1
6
Gruene
1.68
0.318
0.00446
1.12
2.57e-05
0.284
1002
5
66
Male
Western Germany
0
7
CDU-CSU
3.62
1.38
0.00335
1.12
0.000362
1.23
1005
2
64
Female
Western Germany
0
6
SPD
2.98
-0.984
0.0039
1.12
0.000215
-0.877
1008
2
39
Male
Western Germany
0
5
CDU-CSU
2.75
-0.753
0.00337
1.12
0.000109
-0.671
1009
2.25
39
Female
Western Germany
1
4
SPD
1.79
0.461
0.00642
1.12
7.81e-05
0.411
1010
1.75
20
Male
Eastern Germany
0
6
Gruene
1.95
-0.198
0.00557
1.12
1.25e-05
-0.177
1014
1.5
28
Female
Western Germany
0
5
Linke
1.9
-0.396
0.00854
1.12
7.72e-05
-0.354
1015
4.25
81
Male
Western Germany
0
5
CDU-CSU
3.48
0.773
0.0045
1.12
0.000154
0.69
1016
2.25
68
Female
Eastern Germany
1
7
Gruene
2.53
-0.277
0.00522
1.12
2.3e-05
-0.247
1017
4.5
56
Female
Western Germany
0
5
FDP
3.12
1.38
0.00501
1.12
0.000547
1.23
1019
2
51
Male
Western Germany
0
7
SPD
3.05
-1.05
0.00459
1.12
0.000292
-0.941
1024
2.25
43
Female
Western Germany
1
6
CDU-CSU
2.57
-0.323
0.00446
1.12
2.66e-05
-0.288
1025
2.25
53
Male
Western Germany
1
4
Gruene
1.71
0.542
0.0043
1.12
7.2e-05
0.483
1026
3
38
Female
Western Germany
1
7
SPD
2.38
0.621
0.00662
1.12
0.000146
0.554
1031
2.25
59
Female
Western Germany
1
8
Gruene
2.53
-0.279
0.00562
1.12
2.51e-05
-0.249
1033
1.75
31
Female
Eastern Germany
0
7
SPD
2.66
-0.913
0.00628
1.12
0.0003
-0.815
1036
1.75
33
Female
Western Germany
1
7
CDU-CSU
2.6
-0.853
0.006
1.12
0.00025
-0.762
1037
2
87
Female
Western Germany
1
6
Gruene
2.61
-0.607
0.00629
1.12
0.000133
-0.542
1039
2.5
70
Male
Eastern Germany
1
6
Gruene
2.45
0.0484
0.00536
1.12
7.17e-07
0.0432
1045
4.25
29
Male
Western Germany
0
7
CDU-CSU
2.99
1.26
0.00517
1.12
0.000473
1.13
1054
2.25
23
Female
Western Germany
0
4
Gruene
1.46
0.793
0.0041
1.12
0.000147
0.707
1055
2
80
Male
Eastern Germany
0
7
SPD
3.6
-1.6
0.00541
1.12
0.000792
-1.43
1058
2
56
Female
Western Germany
0
6
CDU-CSU
3.16
-1.16
0.00271
1.12
0.000206
-1.03
1060
3.5
21
Female
Western Germany
0
6
Would not vote
2.98
0.515
0.0115
1.12
0.000177
0.461
1061
2.5
62
Male
Eastern Germany
0
8
Would not vote
4.23
-1.73
0.0108
1.12
0.00189
-1.55
1062
1.5
81
Male
Eastern Germany
1
5
Linke
2.59
-1.09
0.0107
1.12
0.000736
-0.975
1063
1.25
33
Female
Western Germany
0
6
Gruene
2.03
-0.784
0.00325
1.12
0.000114
-0.699
1065
2.5
23
Female
Eastern Germany
1
5
CDU-CSU
2.07
0.429
0.00786
1.12
8.31e-05
0.383
1066
3.5
56
Male
Eastern Germany
0
6
CDU-CSU
3.29
0.206
0.00386
1.12
9.38e-06
0.184
1067
2.25
26
Female
Western Germany
0
4
SPD
1.92
0.326
0.00589
1.12
3.6e-05
0.291
1069
6.5
27
Male
Eastern Germany
0
7
FDP
3.16
3.34
0.00678
1.12
0.00434
2.98
1072
4.75
19
Male
Eastern Germany
0
7
AfD
4.49
0.265
0.00979
1.12
3.96e-05
0.237
1073
2
50
Male
Western Germany
1
4
FDP
2.55
-0.546
0.00626
1.12
0.000107
-0.488
1075
4
71
Female
Eastern Germany
1
7
Linke
2.73
1.27
0.00886
1.12
0.000823
1.14
1077
6
90
Female
Eastern Germany
1
8
SPD
3.52
2.48
0.00751
1.12
0.00264
2.21
1079
1.75
36
Male
Eastern Germany
0
6
Gruene
2.22
-0.474
0.00443
1.12
5.68e-05
-0.423
1081
4.5
39
Male
Eastern Germany
0
6
FDP
3.17
1.33
0.00574
1.12
0.000586
1.19
1090
3.25
57
Female
Western Germany
0
4
CDU-CSU
2.77
0.482
0.00413
1.12
5.47e-05
0.43
1093
2.25
62
Male
Eastern Germany
1
6
Gruene
2.31
-0.0637
0.00486
1.12
1.13e-06
-0.0568
1094
1.25
50
Female
Eastern Germany
0
8
Gruene
2.78
-1.53
0.00472
1.12
0.000629
-1.36
1109
3.5
66
Male
Western Germany
0
4
FDP
3.18
0.32
0.00644
1.12
3.77e-05
0.285
1110
1.75
56
Male
Western Germany
1
6
CDU-CSU
2.89
-1.14
0.00384
1.12
0.000285
-1.02
1111
4.25
58
Female
Eastern Germany
0
7
SPD
3.13
1.12
0.00472
1.12
0.000339
1
1114
1.75
26
Male
Western Germany
1
5
Linke
1.6
0.154
0.00957
1.12
1.31e-05
0.138
1115
4.25
74
Male
Western Germany
0
8
CDU-CSU
3.96
0.286
0.00456
1.12
2.14e-05
0.255
1116
1.25
38
Male
Western Germany
0
7
CDU-CSU
3.14
-1.89
0.00427
1.12
0.000871
-1.69
1117
1.75
63
Female
Western Germany
0
7
Gruene
2.75
-1
0.00372
1.12
0.000214
-0.896
1118
2.75
36
Female
Eastern Germany
0
5
CDU-CSU
2.65
0.0961
0.0054
1.12
2.85e-06
0.0858
1120
2
25
Male
Western Germany
0
8
FDP
3.28
-1.28
0.00835
1.12
0.000792
-1.15
1121
5
82
Male
Western Germany
0
8
SPD
3.79
1.21
0.0061
1.12
0.000511
1.08
1122
3.25
60
Female
Western Germany
1
7
Gruene
2.34
0.906
0.00439
1.12
0.000206
0.808
1126
2.25
81
Female
Western Germany
0
8
SPD
3.68
-1.43
0.00569
1.12
0.000668
-1.28
1131
5.5
43
Male
Western Germany
0
7
SPD
2.92
2.58
0.00499
1.12
0.00191
2.31
1134
2.25
49
Female
Western Germany
1
4
CDU-CSU
2.27
-0.0218
0.00521
1.12
1.41e-07
-0.0194
1136
1.25
49
Male
Eastern Germany
0
6
Gruene
2.45
-1.2
0.0042
1.12
0.000344
-1.07
1143
4
60
Female
Western Germany
0
7
Would not vote
3.86
0.141
0.0103
1.12
1.17e-05
0.126
1144
4.5
66
Male
Western Germany
0
6
CDU-CSU
3.42
1.08
0.00299
1.12
0.000199
0.962
1147
2.5
20
Female
Western Germany
0
5
Would not vote
2.76
-0.265
0.0114
1.12
4.65e-05
-0.237
1148
3
36
Male
Western Germany
0
6
AfD
4.53
-1.53
0.00794
1.12
0.00107
-1.37
1157
5
28
Male
Western Germany
1
6
AfD
4.03
0.966
0.0104
1.12
0.000559
0.864
1160
1.25
31
Male
Western Germany
0
6
Gruene
2.09
-0.842
0.00371
1.12
0.00015
-0.751
1161
2.25
54
Female
Eastern Germany
0
8
Linke
3
-0.747
0.00804
1.12
0.000258
-0.668
1164
2.75
58
Male
Western Germany
0
4
FDP
3.04
-0.292
0.00585
1.12
2.86e-05
-0.261
1167
3.25
55
Male
Eastern Germany
0
6
Linke
2.7
0.548
0.00759
1.12
0.000131
0.49
1171
2.25
26
Male
Eastern Germany
0
7
Other party
3.18
-0.933
0.0133
1.12
0.000671
-0.836
1173
4.25
67
Female
Eastern Germany
1
7
SPD
2.92
1.33
0.00606
1.12
0.00061
1.18
1178
1.75
70
Female
Western Germany
0
6
CDU-CSU
3.4
-1.65
0.00304
1.12
0.00047
-1.47
1179
2.5
40
Female
Western Germany
1
7
CDU-CSU
2.72
-0.224
0.00534
1.12
1.53e-05
-0.2
1180
1.25
30
Female
Eastern Germany
1
7
Gruene
1.87
-0.622
0.00577
1.12
0.000128
-0.555
1181
1.75
46
Male
Western Germany
1
5
Gruene
1.79
-0.04
0.00351
1.12
3.2e-07
-0.0357
1185
2.5
27
Male
Western Germany
0
6
Gruene
2.02
0.477
0.00399
1.12
5.16e-05
0.425
1186
6
59
Male
Western Germany
0
6
CDU-CSU
3.3
2.7
0.00285
1.12
0.00118
2.41
1187
5.25
43
Female
Western Germany
0
6
Would not vote
3.36
1.89
0.00996
1.12
0.00204
1.69
1188
2
22
Male
Western Germany
0
4
FDP
2.42
-0.422
0.00608
1.12
6.2e-05
-0.377
1189
2.25
61
Female
Western Germany
0
7
CDU-CSU
3.44
-1.19
0.00305
1.12
0.000248
-1.06
1191
1.75
37
Male
Western Germany
1
4
Linke
1.58
0.167
0.00933
1.12
1.5e-05
0.149
1192
1.25
51
Male
Western Germany
0
5
Linke
2.39
-1.14
0.00803
1.12
0.000595
-1.01
1193
6
72
Female
Eastern Germany
0
8
Linke
3.31
2.69
0.0083
1.12
0.00346
2.41
1194
2.5
61
Female
Western Germany
0
6
CDU-CSU
3.24
-0.742
0.00275
1.12
8.61e-05
-0.661
1195
1.5
52
Female
Western Germany
0
5
Gruene
2.16
-0.66
0.00306
1.12
7.59e-05
-0.588
1198
3
42
Male
Western Germany
0
4
FDP
2.77
0.233
0.00536
1.12
1.67e-05
0.208
1199
2.75
18
Male
Western Germany
0
5
Gruene
1.67
1.08
0.00432
1.12
0.00029
0.967
1202
1.75
27
Male
Western Germany
0
5
SPD
2.24
-0.486
0.00526
1.12
7.09e-05
-0.433
1204
3.75
43
Female
Western Germany
0
7
CDU-CSU
3.13
0.616
0.00362
1.12
7.83e-05
0.549
1205
2.5
29
Male
Eastern Germany
1
5
Gruene
1.54
0.958
0.00554
1.12
0.000291
0.855
1209
1.5
38
Female
Eastern Germany
0
7
Linke
2.52
-1.02
0.00796
1.12
0.000476
-0.911
1211
4
71
Female
Eastern Germany
0
8
CDU-CSU
3.86
0.135
0.00407
1.12
4.24e-06
0.121
1213
3.5
57
Male
Western Germany
1
5
FDP
2.87
0.631
0.00565
1.12
0.000129
0.563
1218
2.25
34
Male
Western Germany
1
6
CDU-CSU
2.51
-0.26
0.00492
1.12
1.91e-05
-0.232
1220
3
55
Female
Western Germany
0
4
CDU-CSU
2.73
0.266
0.00407
1.12
1.65e-05
0.238
1225
1.5
56
Male
Western Germany
1
5
CDU-CSU
2.69
-1.19
0.00398
1.12
0.00032
-1.06
1226
2.25
72
Male
Eastern Germany
1
6
Linke
2.64
-0.387
0.00888
1.12
7.65e-05
-0.346
1229
3
43
Male
Eastern Germany
0
5
SPD
2.56
0.443
0.00582
1.12
6.54e-05
0.396
1231
1
59
Female
Eastern Germany
1
5
Gruene
1.97
-0.967
0.00581
1.12
0.000311
-0.863
1236
2.5
80
Female
Western Germany
0
7
CDU-CSU
3.77
-1.27
0.00373
1.12
0.000344
-1.13
1237
2
74
Female
Eastern Germany
0
7
CDU-CSU
3.71
-1.71
0.00399
1.12
0.000668
-1.53
1238
1.75
39
Male
Eastern Germany
1
6
Other party
2.85
-1.1
0.0136
1.12
0.00095
-0.983
1239
4
66
Female
Western Germany
0
5
Gruene
2.4
1.6
0.00387
1.12
0.000564
1.43
1240
2
73
Male
Western Germany
0
6
Gruene
2.82
-0.817
0.00438
1.12
0.000167
-0.728
1248
4.75
59
Male
Eastern Germany
0
6
Linke
2.77
1.98
0.00768
1.12
0.00173
1.77
1249
2.25
32
Female
Western Germany
0
6
FDP
2.91
-0.657
0.00518
1.12
0.000128
-0.586
1252
3
44
Male
Western Germany
1
6
FDP
2.85
0.152
0.00556
1.12
7.4e-06
0.136
1254
4.75
64
Female
Western Germany
0
7
CDU-CSU
3.5
1.25
0.00307
1.12
0.000275
1.12
1255
1.25
35
Female
Western Germany
0
5
SPD
2.28
-1.03
0.00462
1.12
0.00028
-0.92
1256
2.5
63
Male
Western Germany
0
4
CDU-CSU
2.96
-0.464
0.00426
1.12
5.23e-05
-0.414
1258
3.25
55
Male
Eastern Germany
0
5
Would not vote
3.51
-0.256
0.0113
1.12
4.28e-05
-0.229
1259
1.5
42
Male
Western Germany
1
5
SPD
2.14
-0.636
0.00527
1.12
0.000122
-0.567
1261
2.5
70
Female
Western Germany
1
6
Gruene
2.31
0.186
0.00445
1.12
8.8e-06
0.166
1262
1.5
26
Male
Western Germany
0
6
Gruene
2.01
-0.506
0.00406
1.12
5.94e-05
-0.451
1264
2
24
Female
Western Germany
0
5
SPD
2.09
-0.0916
0.00553
1.12
2.66e-06
-0.0818
1265
3.75
77
Male
Western Germany
0
7
AfD
5.44
-1.69
0.00892
1.12
0.00147
-1.51
1267
1.25
25
Male
Western Germany
1
4
Gruene
1.23
0.0246
0.0045
1.12
1.55e-07
0.0219
1277
2
61
Female
Western Germany
1
5
FDP
2.85
-0.846
0.00636
1.12
0.000261
-0.755
1281
2.5
52
Female
Western Germany
1
5
Gruene
1.8
0.699
0.00373
1.12
0.000104
0.623
1285
5.5
65
Male
Eastern Germany
1
8
FDP
3.66
1.84
0.00703
1.12
0.00137
1.64
1286
1.5
37
Female
Eastern Germany
0
7
Gruene
2.35
-0.851
0.00443
1.12
0.000183
-0.759
1287
2.25
59
Female
Western Germany
0
6
Gruene
2.48
-0.233
0.00312
1.12
9.63e-06
-0.208
1288
1
23
Female
Western Germany
0
6
SPD
2.28
-1.28
0.00584
1.12
0.000545
-1.14
1291
6.5
50
Male
Eastern Germany
0
7
AfD
5.02
1.48
0.00754
1.12
0.000948
1.32
1292
4.5
71
Male
Eastern Germany
0
8
CDU-CSU
3.96
0.543
0.00421
1.12
7.08e-05
0.484
1294
2.75
56
Female
Western Germany
0
4
CDU-CSU
2.75
-0.000961
0.0041
1.12
2.16e-10
-0.000857
1295
2.5
54
Male
Eastern Germany
0
6
CDU-CSU
3.26
-0.759
0.00387
1.12
0.000127
-0.677
1301
3.75
79
Female
Eastern Germany
0
8
CDU-CSU
4
-0.253
0.00437
1.12
1.6e-05
-0.226
1302
2
53
Male
Eastern Germany
1
6
Gruene
2.16
-0.159
0.00459
1.12
6.58e-06
-0.141
1304
2.5
51
Male
Eastern Germany
1
4
Gruene
1.72
0.781
0.00644
1.12
0.000225
0.697
1305
3.75
60
Male
Eastern Germany
0
5
CDU-CSU
3.16
0.59
0.0048
1.12
9.55e-05
0.526
1306
4.5
57
Male
Western Germany
0
4
AfD
4.49
0.0121
0.00904
1.12
7.57e-08
0.0108
1307
4.5
73
Female
Western Germany
0
8
AfD
5.48
-0.981
0.00993
1.12
0.000552
-0.878
1310
3.75
79
Female
Western Germany
0
7
CDU-CSU
3.75
-0.00499
0.00366
1.12
5.2e-09
-0.00445
1311
2.25
60
Male
Western Germany
0
6
SPD
3.01
-0.757
0.00393
1.12
0.000129
-0.675
1313
2.25
73
Female
Western Germany
0
5
Would not vote
3.68
-1.43
0.0113
1.12
0.00133
-1.28
1317
1.5
52
Female
Western Germany
0
5
Gruene
2.16
-0.66
0.00306
1.12
7.59e-05
-0.588
1318
1.5
36
Male
Eastern Germany
1
7
CDU-CSU
2.79
-1.29
0.00592
1.12
0.000567
-1.15
1326
3.5
68
Female
Eastern Germany
1
8
Linke
2.88
0.62
0.00916
1.12
0.000203
0.554
1327
2.25
64
Male
Western Germany
0
6
Gruene
2.66
-0.411
0.00369
1.12
3.56e-05
-0.367
1330
5
71
Male
Western Germany
0
7
CDU-CSU
3.71
1.29
0.00349
1.12
0.000331
1.15
1333
5
61
Female
Eastern Germany
1
8
AfD
4.96
0.0387
0.0108
1.12
9.34e-07
0.0347
1335
4.25
80
Female
Eastern Germany
0
5
SPD
3.1
1.15
0.00733
1.12
0.000554
1.03
1337
3.75
71
Male
Western Germany
0
6
CDU-CSU
3.51
0.243
0.00321
1.12
1.08e-05
0.217
1340
3.5
45
Female
Western Germany
1
6
Other party
2.81
0.688
0.0135
1.12
0.000372
0.616
1344
2
35
Male
Western Germany
0
4
CDU-CSU
2.48
-0.481
0.00421
1.12
5.57e-05
-0.429
1348
3
53
Male
Eastern Germany
0
6
Linke
2.67
0.332
0.00756
1.12
4.8e-05
0.297
1352
4.25
47
Male
Eastern Germany
0
8
CDU-CSU
3.54
0.707
0.00473
1.12
0.000135
0.63
1356
1
34
Female
Western Germany
0
6
Gruene
2.05
-1.05
0.0032
1.12
0.000202
-0.938
1358
1.5
27
Male
Eastern Germany
0
6
Gruene
2.07
-0.569
0.00496
1.12
9.17e-05
-0.507
1361
2.5
27
Male
Western Germany
0
6
FDP
2.91
-0.413
0.00551
1.12
5.37e-05
-0.369
1362
2.5
31
Female
Western Germany
0
4
SPD
2.01
0.49
0.00553
1.12
7.61e-05
0.438
1363
3.25
57
Female
Western Germany
0
6
SPD
2.86
0.387
0.0038
1.12
3.24e-05
0.345
1364
4.25
85
Male
Western Germany
0
4
FDP
3.51
0.742
0.00879
1.12
0.000279
0.663
1369
1
60
Female
Eastern Germany
0
8
Linke
3.1
-2.1
0.00799
1.12
0.00203
-1.88
1372
1.75
62
Female
Western Germany
0
5
SPD
2.75
-0.997
0.00424
1.12
0.000241
-0.889
1373
2.5
77
Female
Eastern Germany
0
8
CDU-CSU
3.97
-1.47
0.00428
1.12
0.000526
-1.31
1374
1.25
48
Female
Western Germany
0
5
Gruene
2.09
-0.841
0.00296
1.12
0.000119
-0.749
1375
1.5
59
Female
Western Germany
0
5
CDU-CSU
3.01
-1.51
0.0031
1.12
0.0004
-1.34
1377
1.5
68
Male
Western Germany
0
4
Gruene
2.33
-0.825
0.00521
1.12
0.000203
-0.737
1381
2
42
Female
Western Germany
0
5
SPD
2.4
-0.402
0.00426
1.12
3.93e-05
-0.359
1382
6.5
63
Male
Eastern Germany
0
7
SPD
3.31
3.19
0.00473
1.12
0.00275
2.85
1385
1.25
72
Male
Western Germany
1
5
Gruene
2.24
-0.988
0.00483
1.12
0.00027
-0.882
1387
2.75
38
Male
Western Germany
0
5
CDU-CSU
2.74
0.0145
0.00343
1.12
4.13e-08
0.013
1389
3.25
77
Female
Western Germany
0
7
SPD
3.41
-0.16
0.00467
1.12
6.87e-06
-0.143
1392
6
71
Female
Eastern Germany
0
8
Linke
3.29
2.71
0.00826
1.12
0.00349
2.42
1393
1
73
Male
Western Germany
1
8
Gruene
2.86
-1.86
0.00629
1.12
0.00125
-1.66
1394
1
38
Male
Eastern Germany
0
6
Other party
3.19
-2.19
0.0125
1.12
0.00347
-1.96
1396
4.5
68
Male
Western Germany
0
6
AfD
5.08
-0.583
0.00812
1.12
0.000159
-0.521
1401
1
42
Female
Western Germany
1
4
FDP
2.32
-1.32
0.00683
1.12
0.000678
-1.18
1404
3.75
71
Male
Western Germany
0
8
CDU-CSU
3.91
-0.162
0.00448
1.12
6.71e-06
-0.144
1407
5.5
38
Male
Western Germany
0
4
AfD
4.16
1.34
0.00867
1.12
0.000896
1.2
1411
3.75
73
Male
Western Germany
0
8
FDP
4.11
-0.361
0.0067
1.12
5.01e-05
-0.322
1412
2.25
31
Male
Eastern Germany
0
5
SPD
2.35
-0.1
0.00649
1.12
3.72e-06
-0.0893
1414
2
51
Male
Western Germany
0
5
CDU-CSU
2.96
-0.96
0.00304
1.12
0.000159
-0.855
1415
2
25
Male
Eastern Germany
1
6
Other party
2.61
-0.605
0.0143
1.12
0.000304
-0.542
1416
7
74
Female
Eastern Germany
0
8
Would not vote
4.35
2.65
0.0111
1.12
0.00451
2.37
1417
7
62
Male
Eastern Germany
0
7
AfD
5.23
1.77
0.00761
1.12
0.00137
1.58
1418
3.5
57
Male
Western Germany
0
4
FDP
3.03
0.475
0.00579
1.12
7.47e-05
0.424
1419
7
81
Female
Eastern Germany
0
8
SPD
3.73
3.27
0.00559
1.12
0.00343
2.92
1422
3.5
76
Female
Western Germany
0
8
CDU-CSU
3.91
-0.406
0.00427
1.12
4.01e-05
-0.362
1423
7
71
Male
Western Germany
0
7
AfD
5.34
1.66
0.00849
1.12
0.00135
1.49
1425
1.5
30
Female
Western Germany
0
4
CDU-CSU
2.3
-0.803
0.0046
1.12
0.000169
-0.716
1426
1.75
54
Male
Western Germany
1
5
Gruene
1.93
-0.178
0.00365
1.12
6.59e-06
-0.159
1427
1
57
Male
Western Germany
1
6
SPD
2.6
-1.6
0.0049
1.12
0.000715
-1.42
1428
2
60
Male
Western Germany
0
5
Gruene
2.39
-0.39
0.00363
1.12
3.14e-05
-0.348
1429
3.25
24
Male
Eastern Germany
0
7
Would not vote
3.38
-0.126
0.0121
1.12
1.13e-05
-0.113
1430
1.5
48
Female
Western Germany
1
4
Gruene
1.53
-0.0296
0.00438
1.12
2.2e-07
-0.0264
1431
2.5
67
Male
Western Germany
0
5
Other party
3.44
-0.94
0.0133
1.12
0.000681
-0.842
1432
5.5
60
Male
Western Germany
1
6
SPD
2.65
2.85
0.00491
1.12
0.00228
2.54
1437
4.25
68
Female
Western Germany
0
7
SPD
3.26
0.995
0.00428
1.12
0.000242
0.887
1438
3.25
66
Male
Eastern Germany
0
8
CDU-CSU
3.87
-0.621
0.00414
1.12
9.12e-05
-0.554
1440
6
58
Male
Eastern Germany
0
4
AfD
4.55
1.45
0.0105
1.12
0.00128
1.3
1441
4.5
57
Male
Western Germany
0
4
Other party
3.07
1.43
0.0135
1.12
0.00161
1.29
1442
2.75
65
Female
Western Germany
0
8
CDU-CSU
3.72
-0.966
0.00404
1.12
0.000215
-0.862
1444
2.25
31
Female
Western Germany
0
7
SPD
2.62
-0.367
0.00577
1.12
4.46e-05
-0.328
1450
2.25
41
Female
Western Germany
0
8
CDU-CSU
3.3
-1.05
0.00508
1.12
0.000322
-0.939
1455
1.25
64
Male
Western Germany
1
5
CDU-CSU
2.83
-1.58
0.00414
1.12
0.000587
-1.41
1456
3
54
Male
Western Germany
0
6
Gruene
2.49
0.511
0.00328
1.12
4.87e-05
0.456
1460
1.5
24
Female
Western Germany
0
4
SPD
1.89
-0.389
0.00606
1.12
5.26e-05
-0.347
1462
2.25
36
Female
Western Germany
1
5
Gruene
1.53
0.725
0.00378
1.12
0.000113
0.646
1467
3
19
Male
Eastern Germany
0
6
Would not vote
3.09
-0.0877
0.0124
1.12
5.52e-06
-0.0786
1471
4.75
44
Female
Western Germany
0
7
FDP
3.32
1.43
0.00523
1.12
0.000614
1.28
1473
4.25
78
Male
Eastern Germany
0
8
SPD
3.77
0.482
0.00555
1.12
7.38e-05
0.43
1475
3
54
Male
Western Germany
0
5
CDU-CSU
3.01
-0.0113
0.00303
1.12
2.22e-08
-0.0101
1477
3.75
59
Female
Eastern Germany
0
8
Other party
3.86
-0.112
0.0132
1.12
9.73e-06
-0.101
1482
1
23
Male
Western Germany
0
7
Linke
2.31
-1.31
0.0106
1.12
0.00105
-1.17
1486
3.25
60
Male
Eastern Germany
0
7
Linke
2.99
0.259
0.00761
1.12
2.94e-05
0.232
1491
1
69
Male
Western Germany
0
4
Gruene
2.34
-1.34
0.00531
1.12
0.000548
-1.2
1493
5
38
Female
Western Germany
0
4
FDP
2.61
2.39
0.0057
1.12
0.00187
2.14
1494
1.75
25
Female
Western Germany
0
5
Linke
1.84
-0.0947
0.00876
1.12
4.52e-06
-0.0847
1495
3.25
34
Male
Western Germany
1
4
AfD
3.73
-0.483
0.0105
1.12
0.000141
-0.432
1497
1.25
20
Female
Western Germany
0
7
Gruene
2.01
-0.763
0.0053
1.12
0.000176
-0.681
1500
1.75
67
Male
Western Germany
0
5
SPD
2.93
-1.18
0.00445
1.12
0.000351
-1.05
1502
5.25
74
Female
Western Germany
0
8
Gruene
3.15
2.1
0.00535
1.12
0.00135
1.88
1504
2.25
60
Female
Eastern Germany
0
7
CDU-CSU
3.47
-1.22
0.00365
1.12
0.000311
-1.09
1508
1.25
53
Male
Eastern Germany
1
4
Gruene
1.75
-0.504
0.00652
1.12
9.48e-05
-0.45
1509
5
86
Female
Western Germany
0
6
SPD
3.36
1.64
0.0054
1.12
0.000828
1.46
1513
1.5
61
Female
Western Germany
1
5
FDP
2.85
-1.35
0.00636
1.12
0.000661
-1.2
1517
3.5
67
Female
Eastern Germany
0
8
SPD
3.49
0.0142
0.0051
1.12
5.89e-08
0.0127
1518
2.75
45
Female
Western Germany
0
4
Gruene
1.84
0.914
0.00369
1.12
0.000176
0.815
1519
4
73
Female
Western Germany
0
8
CDU-CSU
3.85
0.146
0.00416
1.12
5.06e-06
0.13
1523
3.75
44
Male
Eastern Germany
1
7
FDP
3.1
0.655
0.0066
1.12
0.000162
0.585
1527
4
49
Male
Western Germany
1
4
CDU-CSU
2.36
1.64
0.00476
1.12
0.000728
1.46
1531
4
56
Male
Western Germany
1
5
CDU-CSU
2.69
1.31
0.00398
1.12
0.000391
1.17
1534
1.5
39
Female
Western Germany
1
8
Gruene
2.18
-0.684
0.00622
1.12
0.000167
-0.611
1539
4
38
Female
Western Germany
0
6
CDU-CSU
2.85
1.15
0.00334
1.12
0.000254
1.03
1541
5.5
94
Female
Western Germany
0
6
CDU-CSU
3.81
1.69
0.00528
1.12
0.000861
1.51
1545
5.5
82
Female
Western Germany
0
8
CDU-CSU
4.01
1.49
0.00458
1.12
0.000581
1.33
1547
6
51
Female
Eastern Germany
0
8
AfD
5.15
0.853
0.00872
1.12
0.000365
0.762
1549
2.5
81
Male
Western Germany
0
8
SPD
3.77
-1.27
0.00604
1.12
0.000562
-1.14
1550
5.5
63
Male
Eastern Germany
0
8
SPD
3.51
1.99
0.00523
1.12
0.00119
1.78
1553
5
58
Male
Western Germany
1
7
AfD
4.75
0.246
0.00982
1.12
3.43e-05
0.22
1555
5
81
Male
Western Germany
1
7
CDU-CSU
3.52
1.48
0.00498
1.12
0.00062
1.32
1557
2.25
61
Male
Western Germany
1
4
CDU-CSU
2.57
-0.321
0.00498
1.12
2.93e-05
-0.286
1558
3
71
Male
Eastern Germany
1
7
Other party
3.6
-0.601
0.0144
1.12
0.000302
-0.539
1559
3.25
50
Female
Western Germany
0
6
CDU-CSU
3.05
0.198
0.00279
1.12
6.19e-06
0.176
1560
4
65
Female
Western Germany
0
6
CDU-CSU
3.31
0.689
0.00284
1.12
7.67e-05
0.614
1565
2.5
61
Male
Western Germany
1
4
CDU-CSU
2.57
-0.0711
0.00498
1.12
1.44e-06
-0.0634
1566
3.75
81
Female
Eastern Germany
0
8
Linke
3.46
0.287
0.00888
1.12
4.21e-05
0.257
1571
6.75
47
Female
Eastern Germany
0
8
FDP
3.62
3.13
0.00629
1.12
0.00354
2.8
1577
2.75
59
Male
Western Germany
0
5
SPD
2.79
-0.0375
0.00414
1.12
3.32e-07
-0.0334
1579
2.25
67
Male
Western Germany
1
6
CDU-CSU
3.08
-0.829
0.00397
1.12
0.000156
-0.74
1580
2.5
52
Female
Western Germany
1
5
CDU-CSU
2.53
-0.026
0.0043
1.12
1.66e-07
-0.0232
1581
1.5
52
Female
Western Germany
1
5
SPD
2.22
-0.716
0.00534
1.12
0.000157
-0.639
1582
5.5
53
Male
Western Germany
0
6
Would not vote
3.63
1.87
0.00994
1.12
0.00201
1.67
1583
2.25
62
Female
Western Germany
0
8
CDU-CSU
3.66
-1.41
0.00406
1.12
0.000463
-1.26
1586
1.75
27
Male
Western Germany
1
8
Other party
3
-1.25
0.0163
1.12
0.00148
-1.12
1589
1.25
28
Male
Western Germany
0
5
Gruene
1.84
-0.588
0.00357
1.12
7.04e-05
-0.524
1591
2
29
Male
Western Germany
0
4
Other party
2.58
-0.582
0.0127
1.12
0.00025
-0.522
1593
2.75
70
Male
Eastern Germany
1
8
Linke
3.01
-0.257
0.00913
1.12
3.48e-05
-0.23
1595
2
57
Male
Eastern Germany
0
5
CDU-CSU
3.11
-1.11
0.00473
1.12
0.000332
-0.989
1596
1.75
66
Male
Western Germany
1
6
FDP
3.23
-1.48
0.00583
1.12
0.000728
-1.32
1597
5.5
87
Female
Eastern Germany
0
8
AfD
5.77
-0.268
0.0101
1.12
4.21e-05
-0.24
1600
3.75
39
Female
Western Germany
0
7
CDU-CSU
3.07
0.685
0.00391
1.12
0.000105
0.611
1601
4.25
18
Female
Eastern Germany
1
7
FDP
2.55
1.7
0.00942
1.12
0.00156
1.52
1605
1
49
Female
Western Germany
1
6
Linke
2.1
-1.1
0.00883
1.12
0.000618
-0.986
1606
1.75
35
Female
Western Germany
0
6
SPD
2.48
-0.734
0.00463
1.12
0.000143
-0.655
1607
2.25
53
Male
Eastern Germany
0
4
Gruene
2.11
0.138
0.00634
1.12
6.92e-06
0.123
1608
1.5
21
Male
Western Germany
0
6
Linke
2.07
-0.571
0.00967
1.12
0.000182
-0.51
1609
3
45
Male
Western Germany
0
6
FDP
3.22
-0.223
0.00458
1.12
1.3e-05
-0.199
1611
1.5
33
Male
Eastern Germany
1
4
Gruene
1.41
0.0913
0.00636
1.12
3.04e-06
0.0815
1616
3.5
66
Male
Eastern Germany
0
4
Would not vote
3.49
0.0068
0.0136
1.12
3.65e-08
0.0061
1622
3.25
70
Male
Eastern Germany
1
8
CDU-CSU
3.58
-0.331
0.0052
1.12
3.27e-05
-0.296
1623
5
66
Female
Eastern Germany
0
5
Other party
3.38
1.62
0.015
1.12
0.00231
1.46
1627
1.5
52
Female
Eastern Germany
0
5
Linke
2.36
-0.856
0.00838
1.12
0.000353
-0.765
1628
2.25
41
Female
Western Germany
1
4
FDP
2.3
-0.0484
0.00684
1.12
9.2e-07
-0.0433
1630
3.75
48
Female
Western Germany
0
5
CDU-CSU
2.82
0.935
0.00306
1.12
0.000152
0.833
1632
2.5
73
Female
Eastern Germany
1
8
Gruene
2.82
-0.316
0.00593
1.12
3.39e-05
-0.282
1634
3.5
39
Female
Eastern Germany
1
5
CDU-CSU
2.35
1.15
0.00653
1.12
0.000497
1.03
1635
2
21
Female
Eastern Germany
0
5
Linke
1.82
0.179
0.00951
1.12
1.76e-05
0.16
1641
3.25
71
Male
Eastern Germany
1
7
CDU-CSU
3.4
-0.146
0.00479
1.12
5.86e-06
-0.13
1644
1.5
18
Male
Western Germany
0
6
SPD
2.28
-0.783
0.00665
1.12
0.000234
-0.699
1647
1.75
35
Female
Eastern Germany
1
5
SPD
1.97
-0.218
0.00773
1.12
2.11e-05
-0.195
1650
2.75
56
Male
Eastern Germany
1
8
SPD
3.03
-0.28
0.00645
1.12
2.9e-05
-0.25
1651
3
75
Male
Eastern Germany
1
8
SPD
3.36
-0.358
0.00639
1.12
4.69e-05
-0.319
1652
4.75
69
Female
Western Germany
0
5
SPD
2.87
1.88
0.00458
1.12
0.000928
1.68
1654
3.25
62
Female
Western Germany
0
5
SPD
2.75
0.503
0.00424
1.12
6.13e-05
0.449
1665
1.5
39
Female
Eastern Germany
0
7
Gruene
2.39
-0.886
0.00433
1.12
0.000194
-0.79
1666
2.5
30
Female
Eastern Germany
0
5
Linke
1.98
0.524
0.00882
1.12
0.000139
0.468
1670
3
79
Female
Western Germany
0
7
Gruene
3.03
-0.0301
0.00486
1.12
2.52e-07
-0.0269
1672
4.5
42
Female
Western Germany
0
8
CDU-CSU
3.32
1.18
0.005
1.12
0.000398
1.05
1676
4.25
20
Female
Eastern Germany
0
7
CDU-CSU
2.78
1.47
0.00666
1.12
0.000822
1.31
1680
3
80
Female
Eastern Germany
0
8
SPD
3.71
-0.71
0.00553
1.12
0.00016
-0.634
1681
1.5
29
Female
Western Germany
0
5
Gruene
1.76
-0.263
0.0033
1.12
1.3e-05
-0.234
1683
4.25
42
Male
Western Germany
0
6
Would not vote
3.44
0.811
0.0101
1.12
0.000384
0.726
1688
1
67
Female
Western Germany
1
5
Gruene
2.06
-1.06
0.00454
1.12
0.000291
-0.945
1690
2.5
52
Male
Western Germany
0
6
Gruene
2.45
0.0455
0.00324
1.12
3.82e-07
0.0406
1691
1.5
41
Male
Eastern Germany
1
5
FDP
2.64
-1.14
0.00714
1.12
0.000531
-1.02
1695
4.5
44
Male
Western Germany
0
6
Gruene
2.32
2.18
0.00323
1.12
0.000876
1.95
1698
2.25
48
Female
Western Germany
0
5
SPD
2.51
-0.255
0.0041
1.12
1.53e-05
-0.228
1700
2
38
Female
Western Germany
0
4
CDU-CSU
2.44
-0.441
0.00418
1.12
4.64e-05
-0.393
1701
4.75
71
Male
Eastern Germany
1
7
CDU-CSU
3.4
1.35
0.00479
1.12
0.000502
1.21
1702
3
65
Male
Western Germany
1
5
CDU-CSU
2.84
0.157
0.00418
1.12
5.92e-06
0.14
1707
2.5
65
Male
Western Germany
0
6
Would not vote
3.84
-1.34
0.0103
1.12
0.00106
-1.19
1708
2
53
Female
Western Germany
0
4
Other party
2.9
-0.904
0.0136
1.12
0.000648
-0.81
1709
1.75
30
Female
Western Germany
0
7
Gruene
2.19
-0.435
0.00433
1.12
4.68e-05
-0.388
1710
3.25
73
Female
Eastern Germany
0
8
Linke
3.33
-0.0751
0.00835
1.12
2.71e-06
-0.0671
1714
1.75
53
Male
Western Germany
1
4
SPD
2.12
-0.373
0.00577
1.12
4.59e-05
-0.333
1717
2.5
25
Male
Western Germany
1
5
Gruene
1.43
1.07
0.00425
1.12
0.000279
0.956
1719
2.75
54
Male
Western Germany
0
5
FDP
3.18
-0.426
0.00474
1.12
4.91e-05
-0.38
1720
2.5
32
Female
Western Germany
0
7
Gruene
2.22
0.28
0.00418
1.12
1.87e-05
0.25
1722
2
64
Female
Western Germany
0
5
Gruene
2.37
-0.367
0.00371
1.12
2.84e-05
-0.327
1723
3.5
81
Female
Western Germany
0
7
SPD
3.48
0.0206
0.00494
1.12
1.2e-07
0.0184
1725
4.5
66
Male
Western Germany
0
7
FDP
3.79
0.712
0.00535
1.12
0.000155
0.636
1732
2
69
Female
Western Germany
1
7
Gruene
2.5
-0.499
0.00476
1.12
6.78e-05
-0.445
1733
6.25
69
Male
Eastern Germany
0
7
AfD
5.35
0.902
0.00789
1.12
0.000369
0.806
1737
2.5
41
Female
Western Germany
0
7
Gruene
2.37
0.125
0.00368
1.12
3.29e-06
0.112
1738
4.25
61
Male
Eastern Germany
1
8
SPD
3.12
1.13
0.0063
1.12
0.000465
1.01
1739
2
36
Female
Western Germany
0
6
SPD
2.5
-0.501
0.00456
1.12
6.53e-05
-0.447
1740
2.25
55
Female
Western Germany
1
6
Gruene
2.06
0.195
0.00371
1.12
8.01e-06
0.174
1741
2.5
75
Male
Eastern Germany
0
6
Linke
3.05
-0.547
0.00862
1.12
0.000148
-0.489
1742
5.75
67
Male
Eastern Germany
0
8
Would not vote
4.32
1.43
0.0109
1.12
0.00129
1.28
1743
3.75
56
Female
Western Germany
0
7
Gruene
2.63
1.12
0.00351
1.12
0.00025
0.996
1744
2
24
Female
Western Germany
1
7
Gruene
1.72
0.277
0.00585
1.12
2.57e-05
0.247
1752
3.25
42
Female
Eastern Germany
0
6
Linke
2.39
0.864
0.0077
1.12
0.00033
0.772
1755
2.5
57
Male
Eastern Germany
1
7
Linke
2.58
-0.0806
0.00825
1.12
3.09e-06
-0.0721
1759
3.25
65
Female
Eastern Germany
0
8
AfD
5.39
-2.14
0.00871
1.12
0.00229
-1.91
1763
4.5
63
Male
Eastern Germany
0
6
AfD
5.04
-0.542
0.008
1.12
0.000135
-0.484
1766
4
59
Male
Western Germany
1
7
SPD
2.83
1.17
0.00548
1.12
0.000426
1.04
1767
2.5
46
Female
Eastern Germany
0
5
Linke
2.25
0.248
0.00832
1.12
2.94e-05
0.222
1768
1.25
33
Female
Western Germany
0
4
Linke
1.78
-0.53
0.00883
1.12
0.000143
-0.474
1772
1.5
23
Male
Western Germany
0
5
Would not vote
2.91
-1.41
0.0112
1.12
0.00128
-1.26
1773
1.5
42
Male
Eastern Germany
1
7
SPD
2.59
-1.09
0.00644
1.12
0.000435
-0.97
1777
1.25
33
Male
Eastern Germany
1
5
Gruene
1.61
-0.361
0.00533
1.12
3.98e-05
-0.322
1786
5.5
78
Female
Western Germany
0
8
FDP
4.1
1.4
0.00686
1.12
0.000766
1.25
1789
3.25
37
Male
Western Germany
0
6
SPD
2.61
0.639
0.00462
1.12
0.000108
0.57
1792
3.5
41
Female
Western Germany
0
7
CDU-CSU
3.1
0.4
0.00376
1.12
3.43e-05
0.357
1800
5.25
61
Female
Western Germany
0
8
CDU-CSU
3.65
1.6
0.00407
1.12
0.000596
1.43
1801
2
75
Female
Western Germany
0
8
SPD
3.58
-1.58
0.0054
1.12
0.00077
-1.41
1803
1.25
46
Male
Eastern Germany
1
5
Gruene
1.84
-0.585
0.00508
1.12
9.95e-05
-0.522
1804
2.25
21
Male
Eastern Germany
0
8
Gruene
2.37
-0.12
0.00722
1.12
5.99e-06
-0.107
1814
3.5
72
Male
Eastern Germany
0
8
FDP
4.14
-0.639
0.00636
1.12
0.000149
-0.571
1817
1.5
67
Male
Western Germany
1
4
CDU-CSU
2.67
-1.17
0.00528
1.12
0.000417
-1.05
1818
2.75
64
Female
Western Germany
0
6
SPD
2.98
-0.234
0.0039
1.12
1.22e-05
-0.209
1821
2.5
83
Female
Eastern Germany
0
8
CDU-CSU
4.07
-1.57
0.00461
1.12
0.000651
-1.4
1825
5.5
75
Female
Western Germany
0
8
Other party
4.09
1.41
0.0146
1.12
0.00169
1.26
1827
6.75
69
Male
Eastern Germany
0
8
AfD
5.55
1.2
0.00815
1.12
0.000675
1.07
1831
1.75
83
Male
Eastern Germany
1
7
Would not vote
4.04
-2.29
0.0135
1.12
0.00409
-2.05
1838
3
80
Male
Western Germany
0
5
CDU-CSU
3.46
-0.46
0.0044
1.12
5.31e-05
-0.41
1839
3.25
79
Male
Eastern Germany
0
8
SPD
3.79
-0.535
0.0056
1.12
9.17e-05
-0.478
1840
2.25
32
Male
Western Germany
1
6
CDU-CSU
2.48
-0.226
0.00511
1.12
1.49e-05
-0.202
1844
1.75
28
Female
Western Germany
0
5
Gruene
1.75
0.00423
0.00335
1.12
3.42e-09
0.00377
1845
2
34
Female
Western Germany
0
5
Other party
2.78
-0.779
0.0123
1.12
0.000432
-0.697
1848
4.25
59
Female
Western Germany
0
6
AfD
4.84
-0.585
0.0084
1.12
0.000165
-0.523
1849
1.5
63
Female
Western Germany
1
4
Gruene
1.79
-0.288
0.00519
1.12
2.47e-05
-0.257
1850
3.75
68
Female
Western Germany
0
7
Gruene
2.84
0.91
0.00397
1.12
0.000187
0.811
1856
3.25
54
Female
Western Germany
0
5
CDU-CSU
2.92
0.331
0.00303
1.12
1.89e-05
0.295
1861
4.25
71
Female
Eastern Germany
0
8
Linke
3.29
0.959
0.00826
1.12
0.000437
0.858
1862
1.5
68
Female
Western Germany
1
7
SPD
2.9
-1.4
0.00562
1.12
0.000627
-1.25
1863
1
69
Female
Eastern Germany
1
8
Linke
2.9
-1.9
0.00919
1.12
0.00191
-1.7
1864
3.25
68
Female
Eastern Germany
0
8
Linke
3.24
0.0111
0.00814
1.12
5.78e-08
0.00993
1873
2.25
41
Male
Western Germany
1
7
CDU-CSU
2.83
-0.584
0.0052
1.12
0.000101
-0.521
1874
1.5
58
Male
Western Germany
1
6
CDU-CSU
2.92
-1.42
0.00383
1.12
0.000444
-1.27
1875
1.5
55
Male
Western Germany
0
5
CDU-CSU
3.03
-1.53
0.00304
1.12
0.000405
-1.36
1880
3.75
58
Male
Western Germany
1
7
SPD
2.82
0.933
0.00549
1.12
0.000274
0.833
1883
7
50
Male
Eastern Germany
0
7
FDP
3.56
3.44
0.00547
1.12
0.00371
3.07
1884
4
32
Male
Western Germany
0
4
CDU-CSU
2.43
1.57
0.00438
1.12
0.000616
1.4
1885
1.25
46
Female
Eastern Germany
1
5
Gruene
1.74
-0.493
0.00544
1.12
7.56e-05
-0.44
1886
2.5
47
Male
Eastern Germany
0
4
Gruene
2.01
0.491
0.0061
1.12
8.44e-05
0.439
1887
2.25
39
Male
Western Germany
1
4
Gruene
1.47
0.783
0.00404
1.12
0.000141
0.699
1888
3.25
67
Male
Eastern Germany
1
8
CDU-CSU
3.53
-0.28
0.00518
1.12
2.32e-05
-0.25
1889
2
61
Female
Western Germany
0
5
Linke
2.47
-0.465
0.00827
1.12
0.000103
-0.416
1891
3
69
Male
Western Germany
0
8
Would not vote
4.31
-1.31
0.0118
1.12
0.00117
-1.17
1892
1.25
63
Male
Western Germany
0
4
FDP
3.13
-1.88
0.00619
1.12
0.00125
-1.68
1896
1.75
54
Male
Western Germany
0
6
SPD
2.9
-1.15
0.00393
1.12
0.000298
-1.03
1897
3.25
50
Male
Eastern Germany
0
7
AfD
5.02
-1.77
0.00754
1.12
0.00136
-1.58
1899
1
69
Male
Western Germany
0
5
Gruene
2.55
-1.55
0.00432
1.12
0.000588
-1.38
1900
4.75
94
Male
Western Germany
0
6
CDU-CSU
3.9
0.846
0.00537
1.12
0.00022
0.755
1901
2.5
59
Male
Western Germany
0
4
SPD
2.58
-0.085
0.00508
1.12
2.1e-06
-0.0758
1904
2.75
54
Female
Eastern Germany
0
7
CDU-CSU
3.37
-0.619
0.00373
1.12
8.15e-05
-0.552
1905
3.5
75
Female
Eastern Germany
0
7
Linke
3.16
0.343
0.00819
1.12
5.54e-05
0.306
1906
5
94
Female
Eastern Germany
0
7
CDU-CSU
4.06
0.941
0.00571
1.12
0.000289
0.84
1907
1.25
48
Male
Western Germany
1
6
Gruene
2.03
-0.777
0.00364
1.12
0.000125
-0.693
1912
2
20
Female
Eastern Germany
0
4
Gruene
1.45
0.549
0.0068
1.12
0.000118
0.491
1914
5.25
38
Female
Eastern Germany
0
8
FDP
3.46
1.79
0.00679
1.12
0.00125
1.6
1918
2.5
25
Male
Western Germany
1
5
Linke
1.58
0.921
0.00966
1.12
0.000473
0.824
1920
6.25
57
Male
Western Germany
0
6
Would not vote
3.7
2.55
0.00998
1.12
0.00376
2.28
1922
2
25
Female
Western Germany
0
7
FDP
2.99
-0.988
0.00658
1.12
0.000369
-0.883
1923
3.75
50
Male
Western Germany
0
5
FDP
3.11
0.643
0.00465
1.12
0.00011
0.574
1924
2
36
Female
Western Germany
0
4
Linke
1.83
0.168
0.00874
1.12
1.42e-05
0.15
1929
4
45
Male
Western Germany
1
5
CDU-CSU
2.5
1.5
0.00413
1.12
0.000531
1.34
1932
3
79
Female
Western Germany
1
6
CDU-CSU
3.19
-0.194
0.00484
1.12
1.04e-05
-0.173
1933
4.75
80
Male
Western Germany
0
5
Would not vote
3.89
0.858
0.012
1.12
0.000512
0.769
1938
4.5
42
Male
Eastern Germany
0
8
CDU-CSU
3.46
1.04
0.0051
1.12
0.000317
0.931
1939
2.25
19
Female
Western Germany
0
4
CDU-CSU
2.11
0.137
0.00556
1.12
5.98e-06
0.122
1943
1.5
57
Female
Western Germany
1
5
Linke
2.04
-0.538
0.00901
1.12
0.00015
-0.481
1944
2
44
Male
Eastern Germany
0
6
Gruene
2.36
-0.362
0.00421
1.12
3.15e-05
-0.323
1946
1.5
18
Female
Western Germany
0
8
CDU-CSU
2.91
-1.41
0.00806
1.12
0.000916
-1.26
1948
4.75
73
Female
Eastern Germany
0
8
Gruene
3.17
1.58
0.00522
1.12
0.000741
1.41
1951
7
58
Male
Eastern Germany
0
8
AfD
5.36
1.64
0.00795
1.12
0.00123
1.47
1952
2.5
47
Female
Eastern Germany
0
7
CDU-CSU
3.25
-0.749
0.00398
1.12
0.000127
-0.668
1953
3.25
66
Female
Eastern Germany
0
8
FDP
3.94
-0.693
0.00619
1.12
0.00017
-0.619
1954
1
54
Male
Western Germany
0
5
Linke
2.44
-1.44
0.00809
1.12
0.000961
-1.28
1957
2.5
73
Male
Western Germany
0
6
CDU-CSU
3.54
-1.04
0.00332
1.12
0.000205
-0.929
1960
1.75
71
Male
Western Germany
0
4
SPD
2.79
-1.04
0.00581
1.12
0.000361
-0.93
1961
1.75
36
Female
Western Germany
0
6
CDU-CSU
2.81
-1.06
0.00348
1.12
0.000224
-0.946
1968
2
21
Male
Western Germany
0
7
Gruene
2.12
-0.122
0.00567
1.12
4.86e-06
-0.109
1974
4.25
51
Female
Eastern Germany
0
7
FDP
3.48
0.768
0.00564
1.12
0.00019
0.685
1976
2
46
Female
Western Germany
0
7
CDU-CSU
3.19
-1.19
0.00344
1.12
0.000276
-1.06
1981
4
55
Female
Western Germany
0
6
SPD
2.83
1.17
0.0038
1.12
0.000297
1.04
1985
3.75
69
Female
Eastern Germany
0
6
CDU-CSU
3.43
0.325
0.00425
1.12
2.56e-05
0.29
1988
3.75
50
Female
Eastern Germany
1
8
FDP
3.31
0.441
0.00753
1.12
8.42e-05
0.394
1990
3.75
22
Male
Western Germany
0
4
CDU-CSU
2.26
1.49
0.00517
1.12
0.000658
1.33
1991
4
20
Male
Eastern Germany
0
5
AfD
4.1
-0.0978
0.00981
1.12
5.41e-06
-0.0874
1993
3.25
72
Male
Western Germany
0
7
SPD
3.42
-0.167
0.00464
1.12
7.36e-06
-0.149
1995
3
30
Female
Western Germany
1
5
CDU-CSU
2.15
0.853
0.00535
1.12
0.000223
0.762
1997
5.25
45
Male
Eastern Germany
0
6
AfD
4.73
0.519
0.00776
1.12
0.00012
0.463
2004
3.25
33
Male
Western Germany
0
5
Gruene
1.92
1.33
0.00333
1.12
0.000334
1.18
2008
2
46
Male
Western Germany
1
5
SPD
2.2
-0.205
0.00512
1.12
1.23e-05
-0.183
2009
2.25
53
Male
Eastern Germany
1
7
SPD
2.78
-0.526
0.00584
1.12
9.25e-05
-0.469
2012
1.25
58
Female
Western Germany
0
5
SPD
2.68
-1.43
0.00413
1.12
0.000481
-1.27
2013
1.75
70
Female
Western Germany
0
6
Gruene
2.67
-0.922
0.00381
1.12
0.000185
-0.823
2016
6.25
27
Male
Western Germany
0
6
AfD
4.38
1.87
0.00857
1.12
0.00173
1.68
2018
1.5
36
Male
Western Germany
0
5
SPD
2.39
-0.891
0.00456
1.12
0.000207
-0.795
2021
4.75
57
Male
Eastern Germany
0
8
CDU-CSU
3.72
1.03
0.00426
1.12
0.00026
0.923
2022
3
26
Female
Western Germany
0
5
Gruene
1.71
1.29
0.00347
1.12
0.000328
1.15
2029
2.5
29
Male
Western Germany
0
6
Gruene
2.06
0.442
0.00384
1.12
4.28e-05
0.394
2034
1.5
55
Male
Western Germany
0
5
Gruene
2.3
-0.804
0.00337
1.12
0.000124
-0.717
2036
1.25
72
Male
Western Germany
1
4
Gruene
2.04
-0.786
0.0058
1.12
0.000205
-0.702
2041
1.75
21
Female
Eastern Germany
0
5
Gruene
1.67
0.0796
0.00568
1.12
2.06e-06
0.0711
2042
2
60
Male
Western Germany
0
7
Gruene
2.79
-0.795
0.00405
1.12
0.000146
-0.709
2043
7
69
Female
Eastern Germany
0
7
FDP
3.79
3.21
0.00605
1.12
0.00356
2.86
2044
2.25
30
Female
Eastern Germany
1
5
Linke
1.62
0.632
0.00983
1.12
0.000227
0.566
2045
7
60
Female
Western Germany
0
5
AfD
4.65
2.35
0.00895
1.12
0.00285
2.1
2052
2.5
61
Female
Eastern Germany
1
5
CDU-CSU
2.73
-0.226
0.00622
1.12
1.83e-05
-0.202
2054
2.5
25
Female
Western Germany
0
6
SPD
2.31
0.189
0.0056
1.12
1.14e-05
0.168
2057
1
33
Male
Western Germany
0
4
Other party
2.65
-1.65
0.0126
1.12
0.002
-1.48
2058
2.5
63
Male
Western Germany
1
5
FDP
2.97
-0.473
0.00593
1.12
7.59e-05
-0.422
2060
2
59
Male
Eastern Germany
1
5
SPD
2.47
-0.474
0.00657
1.12
8.48e-05
-0.424
2065
3.75
58
Male
Eastern Germany
0
7
CDU-CSU
3.53
0.219
0.00369
1.12
1.01e-05
0.196
2066
3.5
82
Female
Eastern Germany
0
8
CDU-CSU
4.05
-0.555
0.00455
1.12
7.99e-05
-0.495
2070
2
33
Female
Western Germany
0
6
FDP
2.92
-0.924
0.00512
1.12
0.00025
-0.825
2071
1.75
68
Male
Western Germany
1
6
SPD
2.79
-1.04
0.00508
1.12
0.000312
-0.925
2073
2.75
45
Male
Western Germany
0
6
Gruene
2.33
0.416
0.00321
1.12
3.17e-05
0.371
2075
2
65
Male
Eastern Germany
1
6
CDU-CSU
3.09
-1.09
0.00487
1.12
0.000331
-0.973
2087
4
69
Male
Eastern Germany
0
7
FDP
3.88
0.115
0.00586
1.12
4.44e-06
0.103
2088
3
51
Female
Western Germany
0
5
Linke
2.29
0.707
0.00793
1.12
0.000228
0.632
2093
2.5
62
Male
Eastern Germany
1
6
CDU-CSU
3.04
-0.539
0.00481
1.12
7.98e-05
-0.481
2095
3.25
80
Female
Eastern Germany
1
8
Linke
3.09
0.163
0.00976
1.12
1.49e-05
0.146
2098
1.75
38
Male
Western Germany
0
6
FDP
3.1
-1.35
0.0048
1.12
0.000502
-1.21
2102
3.25
65
Male
Western Germany
0
5
CDU-CSU
3.2
0.049
0.00331
1.12
4.52e-07
0.0437
2104
2.25
47
Male
Western Germany
1
5
Gruene
1.81
0.443
0.00351
1.12
3.92e-05
0.395
2105
2.5
34
Male
Eastern Germany
0
6
Gruene
2.19
0.311
0.00452
1.12
2.49e-05
0.277
2109
2
43
Male
Western Germany
1
6
Gruene
1.94
0.0592
0.00371
1.12
7.41e-07
0.0528
2110
4.25
63
Male
Eastern Germany
0
6
FDP
3.58
0.671
0.00584
1.12
0.000151
0.599
2113
1
28
Female
Eastern Germany
1
6
Gruene
1.64
-0.635
0.00558
1.12
0.000129
-0.567
2115
1.5
25
Male
Western Germany
1
6
Gruene
1.63
-0.13
0.00471
1.12
4.58e-06
-0.116
2116
2.25
57
Male
Eastern Germany
0
6
CDU-CSU
3.31
-1.06
0.00386
1.12
0.000248
-0.946
2123
4.25
60
Female
Western Germany
0
4
CDU-CSU
2.82
1.43
0.00424
1.12
0.000495
1.28
2124
2.5
36
Female
Western Germany
0
8
Gruene
2.49
0.00885
0.00545
1.12
2.44e-08
0.0079
2126
1.75
24
Male
Western Germany
1
5
Gruene
1.41
0.339
0.00432
1.12
2.84e-05
0.303
2127
2.5
76
Female
Western Germany
0
6
Gruene
2.78
-0.276
0.00437
1.12
1.9e-05
-0.246
2128
1.5
61
Female
Eastern Germany
0
6
Linke
2.71
-1.21
0.00775
1.12
0.000656
-1.08
2131
4.25
81
Male
Western Germany
0
7
CDU-CSU
3.88
0.368
0.00404
1.12
3.12e-05
0.328
2132
1.75
54
Male
Western Germany
0
4
Gruene
2.08
-0.334
0.0041
1.12
2.61e-05
-0.298
2142
2.25
74
Male
Western Germany
0
6
Gruene
2.83
-0.584
0.00447
1.12
8.7e-05
-0.521
2145
2.25
55
Female
Western Germany
1
5
SPD
2.27
-0.0176
0.00534
1.12
9.48e-08
-0.0157
2158
4
56
Male
Western Germany
0
4
CDU-CSU
2.84
1.16
0.00398
1.12
0.000304
1.03
2160
4
68
Female
Eastern Germany
0
8
Would not vote
4.25
-0.245
0.0108
1.12
3.77e-05
-0.219
2163
2.75
66
Male
Western Germany
0
5
CDU-CSU
3.22
-0.468
0.00336
1.12
4.19e-05
-0.418
2166
4.25
83
Male
Eastern Germany
1
8
SPD
3.5
0.754
0.00676
1.12
0.000221
0.674
2170
2.5
21
Male
Western Germany
0
4
Gruene
1.51
0.985
0.00433
1.12
0.00024
0.879
2174
2.5
71
Male
Western Germany
1
6
FDP
3.31
-0.813
0.00614
1.12
0.000233
-0.726
2177
3.5
54
Male
Eastern Germany
0
6
FDP
3.42
0.0762
0.00556
1.12
1.85e-06
0.0681
2180
2.5
67
Male
Western Germany
1
4
Gruene
1.95
0.55
0.00527
1.12
9.14e-05
0.491
2181
3.5
62
Male
Eastern Germany
0
7
SPD
3.29
0.211
0.00472
1.12
1.19e-05
0.188
2183
2.5
59
Female
Western Germany
0
7
Would not vote
3.84
-1.34
0.0103
1.12
0.00107
-1.2
2186
3
61
Female
Western Germany
0
6
FDP
3.41
-0.407
0.00483
1.12
4.57e-05
-0.363
2187
4.75
70
Male
Western Germany
1
4
AfD
4.35
0.396
0.0115
1.12
0.000105
0.355
2189
4.25
80
Female
Western Germany
1
8
CDU-CSU
3.62
0.634
0.00582
1.12
0.000134
0.566
2192
1.5
24
Male
Western Germany
0
5
SPD
2.18
-0.684
0.00555
1.12
0.000149
-0.611
2195
2.25
44
Female
Western Germany
0
6
FDP
3.11
-0.864
0.00466
1.12
0.000199
-0.771
2196
1.75
49
Male
Western Germany
0
5
Linke
2.35
-0.601
0.00801
1.12
0.000166
-0.537
2197
2
57
Female
Western Germany
1
4
Gruene
1.68
0.315
0.00477
1.12
2.71e-05
0.281
2199
5
39
Male
Western Germany
0
8
SPD
3.05
1.95
0.0068
1.12
0.00148
1.74
2201
4
86
Male
Western Germany
1
6
CDU-CSU
3.41
0.593
0.00523
1.12
0.000105
0.529
2202
1.75
80
Female
Western Germany
1
7
SPD
3.1
-1.35
0.00614
1.12
0.000644
-1.21
2203
3
36
Male
Western Germany
0
6
Other party
3.11
-0.108
0.012
1.12
8.09e-06
-0.0967
2208
2.25
55
Female
Western Germany
0
5
CDU-CSU
2.94
-0.686
0.00304
1.12
8.14e-05
-0.612
2209
3.25
52
Male
Eastern Germany
1
8
CDU-CSU
3.27
-0.0211
0.00556
1.12
1.42e-07
-0.0188
2212
2.25
23
Female
Western Germany
1
5
Gruene
1.3
0.949
0.00451
1.12
0.000232
0.847
2213
4
69
Male
Western Germany
1
5
Gruene
2.19
1.81
0.00455
1.12
0.000855
1.62
2216
2
21
Male
Western Germany
1
5
Gruene
1.36
0.641
0.00457
1.12
0.000107
0.572
2217
4
79
Male
Western Germany
0
7
SPD
3.54
0.463
0.00502
1.12
6.15e-05
0.413
2219
6
57
Male
Western Germany
0
4
AfD
4.49
1.51
0.00904
1.12
0.00119
1.35
2220
2.5
20
Male
Western Germany
1
6
CDU-CSU
2.27
0.231
0.00653
1.12
2e-05
0.206
2225
2
60
Male
Western Germany
1
5
SPD
2.45
-0.446
0.00506
1.12
5.76e-05
-0.398
2229
4
64
Male
Western Germany
0
8
Gruene
3.07
0.934
0.00543
1.12
0.000271
0.833
2230
1.25
29
Male
Western Germany
0
4
Linke
1.8
-0.554
0.009
1.12
0.000159
-0.495
2232
2
25
Male
Western Germany
0
4
FDP
2.47
-0.473
0.00588
1.12
7.55e-05
-0.423
2235
2.5
62
Female
Eastern Germany
0
7
SPD
3.2
-0.697
0.00471
1.12
0.000131
-0.622
2237
2.75
58
Female
Western Germany
1
6
Gruene
2.11
0.643
0.00379
1.12
8.93e-05
0.573
2238
6.5
57
Male
Western Germany
0
6
Would not vote
3.7
2.8
0.00998
1.12
0.00453
2.51
2239
1
43
Male
Eastern Germany
0
5
FDP
3.03
-2.03
0.00628
1.12
0.00149
-1.81
2240
3.75
57
Female
Western Germany
0
5
CDU-CSU
2.97
0.779
0.00306
1.12
0.000106
0.695
2244
2.75
57
Male
Western Germany
1
5
CDU-CSU
2.7
0.0454
0.00398
1.12
4.69e-07
0.0405
2245
3
69
Male
Eastern Germany
0
8
SPD
3.61
-0.613
0.00526
1.12
0.000113
-0.547
2246
3.75
79
Female
Western Germany
1
8
CDU-CSU
3.6
0.151
0.00577
1.12
7.53e-06
0.135
2247
5
85
Female
Western Germany
0
7
Would not vote
4.29
0.709
0.0118
1.12
0.000345
0.635
2248
4.5
42
Male
Western Germany
0
7
Gruene
2.48
2.02
0.00411
1.12
0.000952
1.8
2250
2
59
Female
Western Germany
0
5
Gruene
2.28
-0.28
0.00338
1.12
1.51e-05
-0.25
2252
1
34
Female
Eastern Germany
0
6
CDU-CSU
2.82
-1.82
0.00488
1.12
0.000925
-1.63
2253
4.5
60
Female
Western Germany
1
4
SPD
2.15
2.35
0.00641
1.12
0.00203
2.1
2254
2
44
Male
Western Germany
0
4
Gruene
1.91
0.0884
0.00375
1.12
1.67e-06
0.0789
2257
1
50
Female
Western Germany
0
5
CDU-CSU
2.85
-1.85
0.00303
1.12
0.000591
-1.65
2261
2.5
41
Male
Western Germany
0
5
Other party
2.99
-0.492
0.0119
1.12
0.000167
-0.44
2263
2.5
70
Female
Western Germany
0
5
CDU-CSU
3.19
-0.695
0.00359
1.12
9.88e-05
-0.62
2266
2
18
Male
Western Germany
0
6
FDP
2.76
-0.758
0.00642
1.12
0.000211
-0.677
2268
2.25
52
Female
Western Germany
0
4
CDU-CSU
2.68
-0.432
0.00402
1.12
4.28e-05
-0.385
2275
1.25
49
Female
Western Germany
1
5
Gruene
1.75
-0.499
0.00367
1.12
5.21e-05
-0.445
2276
4
47
Female
Western Germany
1
5
CDU-CSU
2.44
1.56
0.00439
1.12
0.00061
1.39
2278
3
65
Male
Western Germany
0
5
Gruene
2.48
0.524
0.00397
1.12
6.22e-05
0.467
2279
3.25
61
Female
Western Germany
0
6
Gruene
2.52
0.733
0.00321
1.12
9.82e-05
0.653
2280
2.5
20
Female
Eastern Germany
0
5
FDP
2.54
-0.0426
0.00788
1.12
8.24e-07
-0.0381
2283
7
56
Female
Western Germany
0
5
CDU-CSU
2.95
4.05
0.00305
1.12
0.00284
3.61
2285
3.75
86
Male
Western Germany
0
7
Gruene
3.24
0.507
0.00607
1.12
8.93e-05
0.452
2286
3.75
65
Female
Eastern Germany
0
7
FDP
3.72
0.0265
0.00585
1.12
2.35e-07
0.0236
2291
6.5
80
Male
Western Germany
0
8
CDU-CSU
4.07
2.43
0.00482
1.12
0.00163
2.17
2293
1.5
66
Male
Western Germany
1
4
FDP
2.82
-1.32
0.00712
1.12
0.000714
-1.18
2294
3.25
66
Female
Eastern Germany
0
8
CDU-CSU
3.78
-0.529
0.004
1.12
6.38e-05
-0.471
2297
3.25
66
Female
Western Germany
0
8
FDP
3.9
-0.648
0.00625
1.12
0.00015
-0.579
2298
3.25
27
Male
Western Germany
0
8
FDP
3.32
-0.0678
0.00811
1.12
2.15e-06
-0.0606
2299
6.75
61
Female
Western Germany
0
8
AfD
5.27
1.48
0.00955
1.12
0.0012
1.32
2303
1.25
45
Male
Eastern Germany
0
5
Gruene
2.18
-0.927
0.00477
1.12
0.000234
-0.827
2308
2
40
Male
Eastern Germany
1
5
Gruene
1.73
0.268
0.00512
1.12
2.1e-05
0.239
2309
1.5
25
Male
Eastern Germany
1
4
Gruene
1.27
0.229
0.0067
1.12
2.02e-05
0.205
2314
3.75
41
Male
Eastern Germany
0
5
CDU-CSU
2.83
0.918
0.00494
1.12
0.000238
0.819
2320
3.25
40
Male
Eastern Germany
1
4
FDP
2.42
0.831
0.00842
1.12
0.000335
0.743
2321
1.25
26
Female
Western Germany
0
6
Gruene
1.91
-0.664
0.00371
1.12
9.33e-05
-0.592
2328
2
74
Male
Western Germany
0
5
SPD
3.05
-1.05
0.00491
1.12
0.000307
-0.933
2329
2.75
30
Female
Eastern Germany
0
4
Linke
1.77
0.976
0.01
1.12
0.000551
0.873
2331
3
79
Female
Eastern Germany
0
6
CDU-CSU
3.6
-0.598
0.0049
1.12
0.0001
-0.533
2332
5
70
Male
Eastern Germany
1
8
CDU-CSU
3.58
1.42
0.0052
1.12
0.000598
1.27
2334
3
72
Female
Eastern Germany
0
8
CDU-CSU
3.88
-0.882
0.0041
1.12
0.000182
-0.787
2337
2
23
Male
Eastern Germany
0
7
FDP
3.09
-1.09
0.00721
1.12
0.000493
-0.975
2338
2.25
25
Female
Western Germany
0
5
Gruene
1.69
0.556
0.00354
1.12
6.23e-05
0.496
2344
2
37
Male
Western Germany
1
7
SPD
2.45
-0.455
0.00664
1.12
7.87e-05
-0.406
2345
3
23
Male
Western Germany
0
5
FDP
2.64
0.359
0.00559
1.12
4.11e-05
0.32
2349
1.5
43
Male
Western Germany
0
5
Gruene
2.1
-0.597
0.00313
1.12
6.35e-05
-0.532
2351
2.5
47
Male
Eastern Germany
0
6
CDU-CSU
3.14
-0.638
0.00403
1.12
9.37e-05
-0.569
2353
4.25
56
Female
Western Germany
1
8
CDU-CSU
3.2
1.05
0.00568
1.12
0.000357
0.935
2355
1.25
67
Male
Western Germany
0
6
SPD
3.13
-1.88
0.00411
1.12
0.000827
-1.67
2358
3.25
29
Female
Eastern Germany
0
7
Would not vote
3.37
-0.12
0.0116
1.12
9.7e-06
-0.108
2361
1.75
52
Female
Western Germany
0
4
SPD
2.37
-0.622
0.00503
1.12
0.000111
-0.555
2364
2.25
41
Male
Western Germany
0
7
FDP
3.36
-1.11
0.00542
1.12
0.000379
-0.988
2367
1.75
35
Male
Western Germany
0
4
Gruene
1.76
-0.00637
0.00374
1.12
8.66e-09
-0.00568
2368
3.25
70
Female
Western Germany
1
5
Gruene
2.11
1.14
0.0048
1.12
0.000355
1.02
2369
2.25
43
Female
Eastern Germany
0
6
CDU-CSU
2.98
-0.727
0.00429
1.12
0.000129
-0.649
2370
1.25
62
Male
Western Germany
0
4
CDU-CSU
2.95
-1.7
0.00421
1.12
0.000691
-1.51
2374
2.5
49
Female
Western Germany
1
6
Gruene
1.95
0.548
0.00364
1.12
6.24e-05
0.489
2377
1.75
79
Male
Western Germany
0
7
Would not vote
4.28
-2.53
0.0114
1.12
0.00424
-2.26
2382
1.75
58
Female
Western Germany
1
6
Linke
2.26
-0.508
0.00886
1.12
0.000132
-0.454
2383
2
47
Female
Western Germany
0
4
CDU-CSU
2.6
-0.596
0.00399
1.12
8.09e-05
-0.531
2387
2
36
Male
Eastern Germany
0
6
Gruene
2.22
-0.224
0.00443
1.12
1.27e-05
-0.2
2388
1.25
33
Female
Eastern Germany
0
7
Gruene
2.28
-1.03
0.00467
1.12
0.000284
-0.921
2390
2
44
Female
Western Germany
0
6
CDU-CSU
2.95
-0.949
0.003
1.12
0.000154
-0.846
2391
3.5
71
Male
Western Germany
1
5
CDU-CSU
2.95
0.554
0.00448
1.12
7.86e-05
0.494
2392
2
48
Male
Western Germany
1
6
FDP
2.92
-0.916
0.00548
1.12
0.000263
-0.818
2405
1.25
33
Female
Western Germany
1
6
Other party
2.61
-1.36
0.0138
1.12
0.00148
-1.21
2406
2
68
Female
Western Germany
0
4
SPD
2.65
-0.648
0.00572
1.12
0.000137
-0.578
2410
5.5
65
Female
Western Germany
1
7
CDU-CSU
3.16
2.34
0.00445
1.12
0.0014
2.09
2418
1.75
61
Female
Western Germany
1
5
Gruene
1.96
-0.206
0.00411
1.12
9.99e-06
-0.184
2420
6.75
68
Male
Western Germany
0
7
FDP
3.82
2.93
0.00544
1.12
0.00267
2.61
2425
2
63
Male
Western Germany
0
4
CDU-CSU
2.96
-0.964
0.00426
1.12
0.000226
-0.86
2428
1.5
68
Male
Western Germany
1
4
Gruene
1.97
-0.467
0.00537
1.12
6.7e-05
-0.417
2430
2.5
58
Female
Western Germany
0
4
SPD
2.48
0.0246
0.00518
1.12
1.8e-07
0.022
2434
1.5
40
Female
Eastern Germany
0
6
Gruene
2.2
-0.7
0.00419
1.12
0.000117
-0.625
2440
4.5
61
Female
Western Germany
0
6
CDU-CSU
3.24
1.26
0.00275
1.12
0.000247
1.12
2445
4.75
49
Female
Western Germany
0
6
SPD
2.73
2.02
0.0039
1.12
0.000911
1.81
2447
2.25
95
Female
Western Germany
0
8
Gruene
3.51
-1.26
0.00756
1.12
0.000688
-1.12
2448
2
53
Female
Eastern Germany
0
7
SPD
3.04
-1.04
0.0048
1.12
0.000298
-0.93
2449
2
41
Male
Western Germany
0
6
Gruene
2.26
-0.265
0.00328
1.12
1.31e-05
-0.236
2450
2.25
57
Male
Western Germany
0
6
SPD
2.96
-0.705
0.00391
1.12
0.000111
-0.629
2452
2
22
Male
Western Germany
0
6
Gruene
1.94
0.0628
0.00441
1.12
9.94e-07
0.056
2455
1.75
34
Male
Eastern Germany
0
6
FDP
3.08
-1.33
0.00599
1.12
0.000606
-1.19
2456
1.75
30
Female
Eastern Germany
1
8
SPD
2.49
-0.739
0.00883
1.12
0.000278
-0.661
2458
3.25
83
Female
Eastern Germany
0
7
SPD
3.56
-0.309
0.00565
1.12
3.09e-05
-0.276
2460
1.75
80
Male
Western Germany
0
6
CDU-CSU
3.66
-1.91
0.00382
1.12
0.000797
-1.71
2464
3.5
52
Female
Western Germany
0
6
Gruene
2.36
1.14
0.00291
1.12
0.000215
1.01
2466
4
41
Female
Eastern Germany
0
7
AfD
4.77
-0.772
0.00862
1.12
0.000296
-0.691
2472
2.75
55
Male
Western Germany
0
5
CDU-CSU
3.03
-0.279
0.00304
1.12
1.34e-05
-0.248
2477
3.25
34
Female
Western Germany
0
5
SPD
2.26
0.986
0.00468
1.12
0.00026
0.88
2482
4.75
76
Male
Eastern Germany
0
6
CDU-CSU
3.64
1.11
0.00455
1.12
0.000321
0.992
2484
1.75
26
Female
Western Germany
1
5
Gruene
1.35
0.397
0.00429
1.12
3.86e-05
0.354
2486
1.75
63
Male
Western Germany
1
4
FDP
2.77
-1.02
0.00688
1.12
0.000411
-0.911
2490
2.25
52
Female
Western Germany
0
7
SPD
2.98
-0.729
0.00431
1.12
0.000131
-0.651
2495
3.5
32
Female
Western Germany
0
5
Gruene
1.81
1.69
0.00316
1.12
0.000511
1.5
2496
3.25
40
Female
Western Germany
0
5
AfD
4.3
-1.05
0.00866
1.12
0.000555
-0.943
2498
2.5
67
Female
Western Germany
1
6
SPD
2.68
-0.177
0.00527
1.12
9.44e-06
-0.158
2500
7
33
Female
Western Germany
0
7
AfD
4.59
2.41
0.00941
1.12
0.00315
2.16
2504
1.5
55
Male
Eastern Germany
1
6
Gruene
2.19
-0.693
0.00462
1.12
0.000127
-0.618
2506
1.75
55
Male
Eastern Germany
1
6
AfD
4.55
-2.8
0.00941
1.12
0.00424
-2.5
2507
2.25
24
Male
Western Germany
0
7
SPD
2.59
-0.339
0.0069
1.12
4.55e-05
-0.303
2508
6
74
Female
Western Germany
0
6
Other party
3.67
2.33
0.0137
1.12
0.00433
2.09
2510
2.25
35
Female
Western Germany
0
8
CDU-CSU
3.2
-0.949
0.00567
1.12
0.000292
-0.847
2515
7
59
Male
Western Germany
0
4
AfD
4.52
2.48
0.00916
1.12
0.00324
2.22
2518
2.25
62
Male
Eastern Germany
0
6
CDU-CSU
3.4
-1.15
0.00391
1.12
0.000294
-1.02
2520
3.25
22
Male
Western Germany
0
6
CDU-CSU
2.66
0.588
0.00506
1.12
0.0001
0.525
2523
1.75
60
Male
Western Germany
0
6
Gruene
2.59
-0.842
0.00348
1.12
0.000141
-0.751
2525
2.75
43
Female
Western Germany
0
4
CDU-CSU
2.53
0.223
0.00404
1.12
1.15e-05
0.199
2528
2.25
60
Male
Western Germany
0
4
SPD
2.6
-0.352
0.00512
1.12
3.63e-05
-0.314
2530
3.25
41
Female
Eastern Germany
1
7
FDP
2.95
0.299
0.00724
1.12
3.71e-05
0.267
2534
4
32
Male
Eastern Germany
0
6
AfD
4.51
-0.507
0.00832
1.12
0.000123
-0.453
2536
2.75
29
Male
Eastern Germany
0
5
SPD
2.32
0.434
0.00666
1.12
7.21e-05
0.388
2537
3.25
51
Female
Western Germany
0
5
CDU-CSU
2.87
0.383
0.00303
1.12
2.53e-05
0.341
2538
3.5
42
Male
Western Germany
0
5
SPD
2.49
1.01
0.00427
1.12
0.000246
0.897
2539
2.25
79
Male
Western Germany
0
6
SPD
3.33
-1.08
0.00483
1.12
0.000325
-0.968
2540
3.5
61
Female
Western Germany
0
6
CDU-CSU
3.24
0.258
0.00275
1.12
1.04e-05
0.23
2541
4.25
76
Male
Eastern Germany
1
7
Linke
2.91
1.34
0.00894
1.12
0.000927
1.2
2542
6
34
Male
Western Germany
0
7
AfD
4.7
1.3
0.00878
1.12
0.000856
1.16
2543
4
85
Male
Western Germany
0
6
CDU-CSU
3.75
0.252
0.00429
1.12
1.55e-05
0.224
2548
4.75
58
Female
Eastern Germany
0
8
CDU-CSU
3.64
1.11
0.00408
1.12
0.000286
0.989
2549
2.25
34
Female
Western Germany
0
5
CDU-CSU
2.57
-0.324
0.00365
1.12
2.18e-05
-0.289
2550
2
34
Male
Eastern Germany
1
6
FDP
2.72
-0.72
0.00694
1.12
0.000207
-0.643
2553
1.5
64
Female
Western Germany
0
5
Gruene
2.37
-0.867
0.00371
1.12
0.000159
-0.773
2556
2
26
Female
Western Germany
1
4
Gruene
1.15
0.85
0.00468
1.12
0.000193
0.758
2559
1
54
Female
Eastern Germany
0
4
Gruene
2.04
-1.04
0.00656
1.12
0.000404
-0.926
2561
4
30
Male
Western Germany
1
8
AfD
4.47
-0.474
0.0126
1.12
0.000165
-0.424
2564
1.5
51
Male
Western Germany
0
4
SPD
2.45
-0.947
0.00488
1.12
0.00025
-0.845
2571
7
80
Male
Eastern Germany
0
8
CDU-CSU
4.11
2.89
0.00456
1.12
0.00217
2.58
2572
3.25
55
Female
Eastern Germany
0
8
Would not vote
4.02
-0.771
0.0107
1.12
0.00037
-0.69
2576
5.5
77
Female
Western Germany
0
4
CDU-CSU
3.11
2.39
0.0055
1.12
0.00179
2.13
2580
4.5
81
Male
Western Germany
0
7
Gruene
3.16
1.34
0.00549
1.12
0.000566
1.2
2582
1.75
30
Female
Eastern Germany
0
8
Gruene
2.43
-0.683
0.00585
1.12
0.000156
-0.61
2585
1.5
35
Male
Western Germany
1
5
SPD
2.02
-0.515
0.00567
1.12
8.61e-05
-0.46
2586
2.5
64
Female
Western Germany
1
5
Linke
2.16
0.341
0.00932
1.12
6.26e-05
0.305
2587
1.75
29
Male
Western Germany
0
5
Gruene
1.86
-0.105
0.00352
1.12
2.23e-06
-0.094
2589
2.75
61
Male
Western Germany
1
7
Gruene
2.45
0.296
0.00452
1.12
2.27e-05
0.264
2590
5.5
68
Male
Eastern Germany
1
8
AfD
5.17
0.326
0.00986
1.12
6.04e-05
0.291
2591
1.75
47
Male
Western Germany
1
5
Gruene
1.81
-0.0573
0.00351
1.12
6.56e-07
-0.0511
2592
2.5
50
Male
Western Germany
1
5
Gruene
1.86
0.641
0.00355
1.12
8.31e-05
0.572
2595
2
69
Male
Western Germany
0
8
SPD
3.57
-1.57
0.0056
1.12
0.000787
-1.4
2596
2
19
Male
Western Germany
0
6
Linke
2.04
-0.0361
0.0099
1.12
7.45e-07
-0.0323
2597
2.5
45
Female
Western Germany
0
5
CDU-CSU
2.76
-0.264
0.00312
1.12
1.24e-05
-0.235
2598
4
64
Male
Eastern Germany
0
6
Linke
2.86
1.14
0.00787
1.12
0.000591
1.02
2600
6.25
53
Male
Western Germany
0
7
CDU-CSU
3.4
2.85
0.00342
1.12
0.00158
2.54
2601
1.25
44
Female
Western Germany
1
5
Gruene
1.66
-0.413
0.00364
1.12
3.54e-05
-0.368
2605
2
20
Male
Western Germany
1
5
SPD
1.76
0.244
0.00713
1.12
2.43e-05
0.218
2608
3.5
63
Male
Eastern Germany
1
6
Gruene
2.33
1.17
0.00491
1.12
0.000384
1.04
2616
2
58
Male
Western Germany
1
4
Gruene
1.79
0.206
0.00456
1.12
1.1e-05
0.183
2620
4.25
66
Male
Western Germany
1
5
AfD
4.49
-0.237
0.0101
1.12
3.27e-05
-0.212
2623
3.25
72
Female
Western Germany
0
7
CDU-CSU
3.63
-0.384
0.00328
1.12
2.76e-05
-0.343
2624
2.5
74
Female
Western Germany
0
5
Gruene
2.54
-0.0389
0.00465
1.12
4.03e-07
-0.0347
2626
2.75
48
Male
Western Germany
0
5
FDP
3.07
-0.323
0.00463
1.12
2.75e-05
-0.288
2627
5.75
49
Male
Western Germany
0
5
FDP
3.09
2.66
0.00464
1.12
0.00188
2.37
2628
2.25
30
Male
Eastern Germany
0
5
Gruene
1.92
0.332
0.00509
1.12
3.21e-05
0.296
2629
2.25
51
Female
Western Germany
0
4
Gruene
1.94
0.31
0.00388
1.12
2.13e-05
0.277
2632
3
57
Male
Western Germany
1
8
CDU-CSU
3.31
-0.312
0.00569
1.12
3.17e-05
-0.279
2633
3
67
Female
Eastern Germany
0
8
Would not vote
4.23
-1.23
0.0108
1.12
0.000943
-1.1
2634
2
33
Female
Eastern Germany
0
5
Other party
2.81
-0.807
0.0138
1.12
0.000521
-0.723
2635
3
64
Male
Western Germany
0
5
Gruene
2.46
0.541
0.0039
1.12
6.51e-05
0.483
2639
2
58
Male
Eastern Germany
0
6
Linke
2.75
-0.754
0.00765
1.12
0.00025
-0.674
2640
3
52
Male
Eastern Germany
1
5
SPD
2.35
0.646
0.00653
1.12
0.000157
0.577
2642
2.25
71
Female
Eastern Germany
0
8
SPD
3.55
-1.3
0.00517
1.12
0.000503
-1.16
2643
1.75
32
Male
Western Germany
0
5
Gruene
1.91
-0.157
0.00337
1.12
4.74e-06
-0.14
2646
2.25
64
Male
Western Germany
1
8
Other party
3.64
-1.39
0.0151
1.12
0.0017
-1.24
2649
3.25
54
Female
Western Germany
0
5
Gruene
2.19
1.06
0.00313
1.12
0.000199
0.941
2650
1.75
65
Male
Western Germany
1
7
Gruene
2.52
-0.773
0.00466
1.12
0.000159
-0.689
2651
2.25
64
Female
Eastern Germany
0
7
Would not vote
3.97
-1.72
0.0104
1.12
0.00179
-1.54
2652
1
76
Female
Eastern Germany
0
6
Linke
2.97
-1.97
0.00873
1.12
0.00196
-1.76
2653
1.75
29
Male
Western Germany
1
6
CDU-CSU
2.42
-0.674
0.00542
1.12
0.000141
-0.602
2665
1.75
78
Female
Western Germany
0
6
Gruene
2.81
-1.06
0.00459
1.12
0.000295
-0.946
2666
3.5
57
Male
Western Germany
1
6
CDU-CSU
2.91
0.593
0.00384
1.12
7.69e-05
0.529
2671
3.75
67
Female
Eastern Germany
0
8
CDU-CSU
3.8
-0.0459
0.00401
1.12
4.81e-07
-0.0409
2674
3.25
64
Female
Western Germany
0
8
Gruene
2.97
0.276
0.00486
1.12
2.12e-05
0.246
2675
2
46
Female
Western Germany
1
6
CDU-CSU
2.62
-0.625
0.00431
1.12
9.61e-05
-0.558
2676
5.5
71
Female
Western Germany
0
8
CDU-CSU
3.82
1.68
0.00411
1.12
0.000662
1.5
2677
4.5
49
Male
Eastern Germany
1
5
AfD
4.24
0.261
0.0102
1.12
4.01e-05
0.233
2678
3.5
24
Male
Western Germany
0
5
SPD
2.18
1.32
0.00555
1.12
0.000551
1.17
2680
4
66
Male
Eastern Germany
0
6
SPD
3.16
0.844
0.00503
1.12
0.000205
0.753
2686
3.75
40
Female
Western Germany
0
6
FDP
3.04
0.705
0.00478
1.12
0.000136
0.629
2687
1.25
46
Female
Western Germany
0
4
Gruene
1.85
-0.604
0.00371
1.12
7.71e-05
-0.538
2689
1.25
43
Female
Eastern Germany
1
5
Gruene
1.69
-0.441
0.00544
1.12
6.06e-05
-0.394
2693
2.5
43
Male
Eastern Germany
0
7
SPD
2.96
-0.462
0.00528
1.12
6.44e-05
-0.412
2695
1.75
57
Female
Western Germany
0
6
Gruene
2.45
-0.698
0.00304
1.12
8.45e-05
-0.623
2698
5.5
35
Male
Eastern Germany
0
7
AfD
4.76
0.739
0.00819
1.12
0.000257
0.66
2701
2
20
Male
Western Germany
0
4
CDU-CSU
2.22
-0.223
0.00537
1.12
1.52e-05
-0.199
2702
6
23
Male
Western Germany
0
6
AfD
4.31
1.69
0.00894
1.12
0.00148
1.51
2703
1.75
55
Female
Western Germany
1
6
Linke
2.21
-0.456
0.00882
1.12
0.000106
-0.408
2706
1
59
Female
Western Germany
1
4
Gruene
1.72
-0.719
0.0049
1.12
0.000145
-0.642
2708
2
56
Female
Western Germany
0
6
Would not vote
3.59
-1.59
0.00986
1.12
0.00144
-1.42
2709
4.5
81
Female
Western Germany
0
5
FDP
3.55
0.951
0.0071
1.12
0.000369
0.849
2710
3.25
35
Female
Eastern Germany
0
7
AfD
4.67
-1.42
0.00897
1.12
0.00104
-1.27
2714
5.75
74
Male
Western Germany
0
5
AfD
4.98
0.766
0.00918
1.12
0.000311
0.685
2716
2.5
62
Male
Western Germany
1
5
FDP
2.96
-0.455
0.00587
1.12
6.98e-05
-0.407
2717
1.75
38
Female
Western Germany
0
7
Gruene
2.32
-0.573
0.00381
1.12
7.15e-05
-0.511
2720
2
28
Male
Western Germany
0
4
Gruene
1.64
0.364
0.00395
1.12
2.99e-05
0.325
2726
4
61
Male
Western Germany
1
6
CDU-CSU
2.98
1.02
0.00385
1.12
0.00023
0.913
2727
3.25
36
Male
Eastern Germany
0
7
CDU-CSU
3.15
0.0988
0.0048
1.12
2.67e-06
0.0881
2729
2.75
37
Male
Western Germany
0
6
Gruene
2.2
0.554
0.00341
1.12
5.97e-05
0.494
2730
4
56
Male
Western Germany
0
7
FDP
3.62
0.385
0.0051
1.12
4.31e-05
0.343
2731
1.5
38
Male
Western Germany
0
4
AfD
4.16
-2.66
0.00867
1.12
0.00353
-2.38
2733
1.75
41
Female
Eastern Germany
0
6
SPD
2.63
-0.883
0.0054
1.12
0.00024
-0.788
2735
6.25
19
Male
Western Germany
0
5
AfD
4.04
2.21
0.00914
1.12
0.00258
1.98
2737
7
47
Male
Eastern Germany
1
7
AfD
4.61
2.39
0.00939
1.12
0.00309
2.14
2739
1
36
Male
Western Germany
0
4
FDP
2.66
-1.66
0.00543
1.12
0.000859
-1.48
2742
2.75
73
Female
Eastern Germany
0
6
CDU-CSU
3.49
-0.744
0.00447
1.12
0.000141
-0.664
2744
6.25
58
Male
Eastern Germany
0
7
AfD
5.16
1.09
0.00752
1.12
0.000516
0.976
2748
1.5
46
Male
Western Germany
1
4
Gruene
1.59
-0.0875
0.00408
1.12
1.78e-06
-0.0781
2749
1.25
57
Female
Eastern Germany
1
7
Gruene
2.34
-1.09
0.00483
1.12
0.000327
-0.97
2750
3.25
72
Male
Western Germany
0
7
SPD
3.42
-0.167
0.00464
1.12
7.36e-06
-0.149
2752
1.5
33
Female
Western Germany
0
5
SPD
2.25
-0.747
0.00475
1.12
0.000151
-0.666
2753
4
63
Male
Western Germany
0
6
FDP
3.53
0.466
0.00484
1.12
6.01e-05
0.416
2754
4.75
74
Male
Western Germany
0
8
SPD
3.65
1.1
0.00572
1.12
0.000394
0.979
2758
3.25
63
Female
Western Germany
0
5
CDU-CSU
3.07
0.176
0.00323
1.12
5.69e-06
0.157
2762
2.5
38
Female
Eastern Germany
0
7
CDU-CSU
3.09
-0.593
0.00458
1.12
9.21e-05
-0.529
2765
6.25
81
Male
Eastern Germany
0
8
FDP
4.29
1.96
0.00697
1.12
0.00153
1.75
2768
1.5
40
Male
Western Germany
1
5
Gruene
1.69
-0.187
0.00355
1.12
7.05e-06
-0.166
2769
2.25
41
Female
Western Germany
1
4
CDU-CSU
2.13
0.116
0.00535
1.12
4.13e-06
0.104
2770
4
58
Female
Eastern Germany
0
7
Gruene
2.71
1.29
0.00413
1.12
0.00039
1.15
2775
2
64
Male
Western Germany
1
7
Gruene
2.51
-0.505
0.00462
1.12
6.74e-05
-0.451
2780
4
53
Female
Western Germany
1
6
FDP
2.91
1.09
0.00586
1.12
0.000399
0.973
2781
4
55
Male
Eastern Germany
0
7
Would not vote
3.91
0.089
0.0103
1.12
4.72e-06
0.0797
2782
2.75
28
Female
Western Germany
0
5
CDU-CSU
2.47
0.279
0.00412
1.12
1.83e-05
0.249
2783
2.75
47
Male
Western Germany
0
5
FDP
3.06
-0.305
0.00462
1.12
2.46e-05
-0.272
2784
3.5
38
Female
Eastern Germany
0
6
FDP
3.06
0.445
0.00608
1.12
6.88e-05
0.397
2787
2.5
43
Male
Eastern Germany
0
5
FDP
3.03
-0.532
0.00628
1.12
0.000102
-0.475
2788
2
40
Male
Western Germany
0
6
Linke
2.4
-0.398
0.00823
1.12
7.51e-05
-0.356
2797
2.75
57
Female
Eastern Germany
0
8
CDU-CSU
3.62
-0.873
0.0041
1.12
0.000179
-0.779
2801
1.75
70
Male
Eastern Germany
1
5
Gruene
2.25
-0.499
0.00623
1.12
8.9e-05
-0.446
2803
3.25
74
Female
Eastern Germany
0
8
SPD
3.61
-0.356
0.00526
1.12
3.82e-05
-0.318
2804
3.5
70
Male
Western Germany
0
5
FDP
3.45
0.0482
0.00568
1.12
7.54e-07
0.043
2812
4.5
73
Male
Eastern Germany
0
7
CDU-CSU
3.79
0.711
0.00395
1.12
0.000114
0.634
2813
2.5
33
Male
Eastern Germany
0
4
Would not vote
2.92
-0.424
0.0128
1.12
0.000134
-0.38
2817
2.25
56
Male
Western Germany
1
6
Gruene
2.16
0.0851
0.00372
1.12
1.53e-06
0.0759
2819
4
42
Male
Western Germany
0
6
CDU-CSU
3.01
0.993
0.00324
1.12
0.000182
0.885
2820
5.25
30
Male
Western Germany
0
5
AfD
4.22
1.03
0.00826
1.12
0.000499
0.916
2821
1.5
51
Female
Eastern Germany
0
7
Gruene
2.59
-1.09
0.00405
1.12
0.000276
-0.975
2824
3.5
65
Male
Eastern Germany
0
7
Linke
3.08
0.423
0.00775
1.12
7.97e-05
0.378
2833
1.5
37
Female
Western Germany
1
6
Gruene
1.74
-0.245
0.0039
1.12
1.34e-05
-0.218
2838
1.75
38
Female
Western Germany
1
7
CDU-CSU
2.69
-0.94
0.00551
1.12
0.000278
-0.839
2839
6
70
Male
Eastern Germany
0
7
AfD
5.36
0.635
0.00795
1.12
0.000184
0.568
2842
3
42
Female
Western Germany
0
7
Linke
2.54
0.457
0.00863
1.12
0.000104
0.409
2844
1
33
Male
Eastern Germany
1
5
Linke
1.76
-0.762
0.0092
1.12
0.000308
-0.681
2845
1.5
62
Male
Western Germany
0
5
SPD
2.84
-1.34
0.00423
1.12
0.000433
-1.19
2846
2.75
33
Female
Western Germany
0
7
Gruene
2.24
0.513
0.00411
1.12
6.17e-05
0.458
2848
2.25
58
Female
Eastern Germany
1
7
Linke
2.51
-0.255
0.00847
1.12
3.18e-05
-0.228
2849
4
80
Male
Western Germany
0
8
FDP
4.23
-0.232
0.00717
1.12
2.21e-05
-0.207
2850
1.25
18
Female
Western Germany
0
5
Gruene
1.57
-0.323
0.00409
1.12
2.44e-05
-0.288
2854
2
47
Male
Western Germany
0
5
Gruene
2.17
-0.166
0.00315
1.12
4.93e-06
-0.148
2855
2.25
54
Female
Western Germany
0
7
Gruene
2.6
-0.349
0.00349
1.12
2.42e-05
-0.311
2856
1
64
Male
Eastern Germany
1
8
Gruene
2.75
-1.75
0.00556
1.12
0.000978
-1.56
2859
2
36
Male
Western Germany
0
4
FDP
2.66
-0.663
0.00543
1.12
0.000136
-0.592
2861
5
69
Female
Western Germany
0
6
FDP
3.54
1.46
0.00528
1.12
0.000639
1.3
2863
2
45
Male
Western Germany
0
4
FDP
2.82
-0.818
0.00538
1.12
0.000206
-0.73
2866
2.25
58
Male
Eastern Germany
0
7
Would not vote
3.96
-1.71
0.0103
1.12
0.00175
-1.53
2867
2
48
Male
Eastern Germany
1
8
Linke
2.63
-0.628
0.00927
1.12
0.000211
-0.562
2868
2.75
79
Female
Eastern Germany
0
8
CDU-CSU
4
-1.25
0.00437
1.12
0.000392
-1.12
2872
1
35
Female
Eastern Germany
1
8
Gruene
2.16
-1.16
0.00636
1.12
0.000491
-1.04
2874
2.75
53
Male
Western Germany
0
5
CDU-CSU
2.99
-0.244
0.00303
1.12
1.03e-05
-0.218
2875
1.25
26
Male
Western Germany
0
7
Gruene
2.21
-0.959
0.00515
1.12
0.000271
-0.855
2876
3.25
53
Male
Eastern Germany
0
7
Linke
2.87
0.38
0.00758
1.12
6.28e-05
0.339
2879
2
81
Female
Western Germany
0
5
Other party
3.59
-1.59
0.0154
1.12
0.00227
-1.43
2880
1.5
22
Female
Western Germany
0
7
FDP
2.94
-1.44
0.00692
1.12
0.000819
-1.28
2881
5.25
58
Male
Eastern Germany
0
6
CDU-CSU
3.33
1.92
0.00386
1.12
0.000814
1.71
2882
3.75
61
Female
Eastern Germany
0
7
Linke
2.92
0.834
0.00752
1.12
0.000301
0.745
2887
2
67
Female
Western Germany
0
4
Gruene
2.22
-0.216
0.00505
1.12
1.34e-05
-0.193
2888
1.5
84
Male
Western Germany
0
8
CDU-CSU
4.14
-2.64
0.00507
1.12
0.00201
-2.35
2890
2.25
66
Female
Eastern Germany
0
7
CDU-CSU
3.58
-1.33
0.00371
1.12
0.000372
-1.18
2898
1.75
41
Female
Western Germany
0
6
Gruene
2.17
-0.422
0.00295
1.12
3e-05
-0.377
2900
2.5
62
Female
Western Germany
1
7
SPD
2.79
-0.293
0.00555
1.12
2.73e-05
-0.262
2903
1.75
71
Female
Western Germany
0
5
Gruene
2.49
-0.737
0.00433
1.12
0.000134
-0.658
2906
1.5
35
Male
Western Germany
0
4
Linke
1.91
-0.407
0.00876
1.12
8.36e-05
-0.364
2907
1
24
Female
Eastern Germany
1
5
Gruene
1.36
-0.364
0.00622
1.12
4.71e-05
-0.325
2911
3.5
64
Male
Eastern Germany
0
7
AfD
5.26
-1.76
0.00767
1.12
0.00137
-1.57
2913
3.75
61
Male
Western Germany
1
8
FDP
3.55
0.204
0.00735
1.12
1.76e-05
0.183
2917
2
27
Male
Western Germany
1
7
Other party
2.8
-0.797
0.0146
1.12
0.00054
-0.714
2918
1.5
32
Female
Western Germany
0
6
Gruene
2.02
-0.517
0.00331
1.12
5.04e-05
-0.461
2919
2.5
34
Female
Eastern Germany
0
6
Gruene
2.1
0.403
0.00441
1.12
4.09e-05
0.359
2921
3.25
47
Female
Western Germany
0
4
Would not vote
3.03
0.222
0.011
1.12
3.14e-05
0.199
2929
2.5
67
Male
Western Germany
0
4
Would not vote
3.47
-0.965
0.0118
1.12
0.00064
-0.864
2938
2
29
Female
Western Germany
0
5
FDP
2.65
-0.653
0.00533
1.12
0.00013
-0.582
2940
4.25
69
Male
Western Germany
1
5
Gruene
2.19
2.06
0.00455
1.12
0.00111
1.84
2941
5.5
69
Male
Western Germany
0
7
FDP
3.84
1.66
0.0055
1.12
0.000867
1.48
2942
1.5
29
Male
Western Germany
0
5
Gruene
1.86
-0.355
0.00352
1.12
2.53e-05
-0.317
2948
4.5
52
Male
Western Germany
0
5
Other party
3.18
1.32
0.0122
1.12
0.00123
1.18
2949
3.5
55
Male
Eastern Germany
0
5
Linke
2.5
1
0.00832
1.12
0.000479
0.894
2954
2
54
Female
Western Germany
0
8
CDU-CSU
3.53
-1.53
0.00426
1.12
0.000566
-1.36
2957
5
31
Female
Western Germany
1
5
FDP
2.33
2.67
0.0065
1.12
0.00266
2.39
2959
1.5
44
Male
Western Germany
1
5
FDP
2.65
-1.15
0.00551
1.12
0.000413
-1.02
2962
2.5
36
Male
Eastern Germany
1
6
Gruene
1.87
0.635
0.00487
1.12
0.000112
0.566
2964
6
60
Male
Eastern Germany
1
7
CDU-CSU
3.21
2.79
0.00466
1.12
0.00208
2.49
2965
6.25
63
Male
Western Germany
0
6
SPD
3.06
3.19
0.00399
1.12
0.00232
2.85
2966
1.75
38
Male
Eastern Germany
0
4
Gruene
1.85
-0.103
0.00599
1.12
3.67e-06
-0.0923
2967
4
46
Female
Western Germany
0
5
CDU-CSU
2.78
1.22
0.0031
1.12
0.000262
1.09
2970
2.25
50
Female
Western Germany
1
5
CDU-CSU
2.49
-0.241
0.00433
1.12
1.44e-05
-0.215
2971
2
60
Male
Western Germany
1
6
Gruene
2.23
-0.234
0.00385
1.12
1.2e-05
-0.209
2976
2.5
25
Female
Western Germany
1
4
SPD
1.55
0.952
0.00733
1.12
0.000382
0.851
2977
3.5
34
Male
Eastern Germany
0
6
Other party
3.12
0.381
0.0126
1.12
0.000106
0.341
2978
3.25
95
Male
Western Germany
1
6
FDP
3.73
-0.477
0.0089
1.12
0.000117
-0.426
2981
5.25
28
Female
Western Germany
0
4
FDP
2.43
2.82
0.00602
1.12
0.00274
2.52
2982
3.25
81
Male
Eastern Germany
0
8
CDU-CSU
4.13
-0.88
0.00462
1.12
0.000204
-0.785
2983
2
27
Male
Western Germany
0
7
Linke
2.38
-0.377
0.0101
1.12
8.3e-05
-0.337
2984
4.75
66
Male
Eastern Germany
0
8
Linke
3.3
1.45
0.00832
1.12
0.00101
1.3
2985
3.25
36
Male
Western Germany
0
7
FDP
3.27
-0.0206
0.0057
1.12
1.38e-07
-0.0183
2986
1
66
Male
Western Germany
0
6
AfD
5.05
-4.05
0.008
1.12
0.00754
-3.62
2989
3.25
52
Male
Eastern Germany
0
4
CDU-CSU
2.82
0.43
0.00621
1.12
6.59e-05
0.384
2991
2.5
32
Male
Western Germany
0
4
CDU-CSU
2.43
0.0705
0.00438
1.12
1.24e-06
0.0629
2996
5.75
57
Female
Western Germany
0
8
AfD
5.21
0.545
0.00955
1.12
0.000163
0.487
2997
2
78
Female
Eastern Germany
0
8
SPD
3.68
-1.68
0.00542
1.12
0.000871
-1.5
2998
2.5
23
Female
Western Germany
0
5
FDP
2.55
-0.0491
0.00576
1.12
7.93e-07
-0.0438
3002
5.5
76
Female
Western Germany
0
6
CDU-CSU
3.5
2
0.0034
1.12
0.000775
1.78
3004
3.75
68
Male
Western Germany
0
6
SPD
3.15
0.605
0.00415
1.12
8.66e-05
0.54
3006
4.75
76
Male
Eastern Germany
0
8
Would not vote
4.48
0.274
0.0113
1.12
4.93e-05
0.246
3010
2.5
69
Male
Western Germany
0
6
CDU-CSU
3.47
-0.972
0.00311
1.12
0.000168
-0.867
3013
2
35
Female
Western Germany
0
4
Other party
2.59
-0.593
0.0131
1.12
0.000268
-0.532
3015
2.25
54
Female
Western Germany
1
4
Gruene
1.63
0.617
0.00461
1.12
0.0001
0.55
3018
2.5
46
Male
Western Germany
0
4
CDU-CSU
2.67
-0.171
0.00389
1.12
6.48e-06
-0.152
3019
1.25
18
Female
Western Germany
0
6
Gruene
1.78
-0.526
0.00446
1.12
7.04e-05
-0.469
3022
1.25
32
Female
Eastern Germany
0
5
Gruene
1.86
-0.61
0.00502
1.12
0.000107
-0.544
3023
2.25
25
Male
Western Germany
0
5
Would not vote
2.94
-0.693
0.011
1.12
0.000306
-0.621
3027
2.25
20
Female
Western Germany
0
5
Gruene
1.61
0.642
0.00392
1.12
9.21e-05
0.573
3028
2.5
21
Male
Western Germany
0
6
SPD
2.33
0.165
0.00624
1.12
9.77e-06
0.148
3029
2.75
64
Male
Western Germany
0
6
Gruene
2.66
0.0886
0.00369
1.12
1.65e-06
0.079
3031
3.75
71
Female
Western Germany
0
6
SPD
3.1
0.646
0.00419
1.12
9.96e-05
0.576
3035
3
56
Female
Eastern Germany
0
7
SPD
3.09
-0.0936
0.00474
1.12
2.37e-06
-0.0835
3037
2.5
62
Female
Western Germany
1
4
Gruene
1.77
0.729
0.00511
1.12
0.000155
0.651
3040
3
67
Male
Eastern Germany
0
8
SPD
3.58
-0.578
0.00523
1.12
0.0001
-0.516
3049
2.5
71
Female
Western Germany
0
8
Linke
3.25
-0.745
0.00976
1.12
0.000313
-0.667
3050
4.5
52
Male
Western Germany
0
5
FDP
3.14
1.36
0.00469
1.12
0.000494
1.21
3051
2.5
28
Male
Western Germany
0
5
AfD
4.19
-1.69
0.00839
1.12
0.00138
-1.51
3052
2.25
92
Female
Western Germany
0
7
CDU-CSU
3.98
-1.73
0.00484
1.12
0.000828
-1.54
3054
2.25
29
Male
Eastern Germany
1
6
Gruene
1.74
0.505
0.00529
1.12
7.73e-05
0.451
3057
4.25
43
Female
Western Germany
0
4
Other party
2.73
1.52
0.0132
1.12
0.00177
1.36
3060
2.75
27
Female
Western Germany
0
4
Would not vote
2.68
0.067
0.0115
1.12
2.97e-06
0.06
3062
3.75
61
Female
Western Germany
0
6
FDP
3.41
0.343
0.00483
1.12
3.25e-05
0.306
3064
1.75
74
Female
Western Germany
1
5
Linke
2.33
-0.581
0.0101
1.12
0.000197
-0.52
3066
4
71
Male
Western Germany
0
8
CDU-CSU
3.91
0.0881
0.00448
1.12
1.99e-06
0.0786
3073
2
57
Female
Western Germany
0
6
Gruene
2.45
-0.448
0.00304
1.12
3.48e-05
-0.4
3074
1.5
56
Male
Western Germany
0
6
Gruene
2.52
-1.02
0.00333
1.12
0.000199
-0.912
3075
1
50
Female
Western Germany
1
4
SPD
1.98
-0.979
0.00621
1.12
0.000341
-0.874
3076
1.5
56
Female
Western Germany
1
7
Gruene
2.28
-0.775
0.00431
1.12
0.000148
-0.691
3077
1.5
35
Male
Western Germany
1
6
SPD
2.22
-0.718
0.00589
1.12
0.000174
-0.641
3080
1
70
Male
Eastern Germany
1
7
Gruene
2.65
-1.65
0.00521
1.12
0.000815
-1.48
3081
4
66
Male
Western Germany
0
4
SPD
2.71
1.29
0.00544
1.12
0.000521
1.16
3082
2.75
40
Male
Western Germany
0
5
AfD
4.4
-1.65
0.00784
1.12
0.00122
-1.47
3084
2.25
63
Male
Eastern Germany
0
6
CDU-CSU
3.41
-1.16
0.00393
1.12
0.000304
-1.04
3085
5.75
86
Female
Eastern Germany
0
7
AfD
5.55
0.202
0.0102
1.12
2.39e-05
0.18
3090
2.75
73
Female
Western Germany
0
5
CDU-CSU
3.25
-0.497
0.0038
1.12
5.34e-05
-0.443
3091
1.25
58
Male
Western Germany
0
6
Gruene
2.56
-1.31
0.0034
1.12
0.000331
-1.17
3092
2
70
Female
Western Germany
0
8
Gruene
3.08
-1.08
0.00511
1.12
0.000339
-0.961
3093
3
39
Male
Eastern Germany
0
7
CDU-CSU
3.2
-0.203
0.00454
1.12
1.07e-05
-0.181
3097
3.75
56
Male
Western Germany
1
4
FDP
2.65
1.1
0.00647
1.12
0.000449
0.983
3098
2.25
50
Male
Western Germany
0
6
Linke
2.57
-0.321
0.00801
1.12
4.74e-05
-0.287
3099
2.75
29
Female
Western Germany
0
7
CDU-CSU
2.89
-0.143
0.00489
1.12
5.7e-06
-0.127
3104
5.25
44
Male
Western Germany
0
7
Would not vote
3.68
1.57
0.0107
1.12
0.00154
1.41
3108
2.5
38
Female
Western Germany
0
5
CDU-CSU
2.64
-0.143
0.0034
1.12
3.97e-06
-0.128
3109
3.75
41
Female
Western Germany
0
4
FDP
2.66
1.09
0.00568
1.12
0.000389
0.976
3112
1.75
57
Male
Eastern Germany
1
8
FDP
3.52
-1.77
0.00699
1.12
0.00126
-1.58
3113
3
77
Female
Eastern Germany
0
6
Linke
2.99
0.0109
0.00883
1.12
6.02e-08
0.00973
3115
2.5
60
Male
Western Germany
0
4
FDP
3.08
-0.577
0.00597
1.12
0.000114
-0.515
3116
1.5
66
Male
Western Germany
0
7
Gruene
2.9
-1.4
0.0043
1.12
0.00048
-1.25
3119
4.75
35
Female
Eastern Germany
1
5
Other party
2.48
2.27
0.0151
1.12
0.00453
2.03
3123
2
34
Female
Western Germany
1
5
Linke
1.64
0.359
0.00924
1.12
6.85e-05
0.321
3124
4
53
Male
Western Germany
0
5
CDU-CSU
2.99
1.01
0.00303
1.12
0.000175
0.897
3128
1.25
42
Female
Eastern Germany
0
5
Gruene
2.03
-0.782
0.00479
1.12
0.000168
-0.698
3129
3.25
54
Male
Western Germany
0
5
SPD
2.7
0.549
0.00407
1.12
6.99e-05
0.489
3132
2.5
20
Male
Western Germany
0
6
CDU-CSU
2.63
-0.128
0.00532
1.12
4.96e-06
-0.114
3134
2.25
55
Female
Western Germany
0
5
CDU-CSU
2.94
-0.686
0.00304
1.12
8.14e-05
-0.612
3139
6
61
Male
Eastern Germany
0
8
AfD
5.41
0.588
0.00796
1.12
0.000158
0.525
3141
7
62
Male
Eastern Germany
0
8
AfD
5.43
1.57
0.00797
1.12
0.00113
1.4
3147
4.75
85
Male
Western Germany
0
6
CDU-CSU
3.75
1
0.00429
1.12
0.000246
0.894
3150
1.5
44
Male
Western Germany
1
5
Gruene
1.76
-0.256
0.00351
1.12
1.31e-05
-0.228
3151
7
33
Male
Eastern Germany
0
7
Would not vote
3.53
3.47
0.0112
1.12
0.00783
3.1
3152
1.25
49
Male
Eastern Germany
1
6
Linke
2.24
-0.99
0.00821
1.12
0.000463
-0.885
3154
2.75
66
Male
Eastern Germany
0
6
Linke
2.89
-0.142
0.00797
1.12
9.22e-06
-0.127
3155
7
69
Male
Eastern Germany
0
8
CDU-CSU
3.92
3.08
0.00417
1.12
0.00226
2.74
3160
4
56
Male
Western Germany
0
8
CDU-CSU
3.65
0.347
0.00457
1.12
3.14e-05
0.309
3161
2.25
21
Female
Western Germany
0
6
FDP
2.72
-0.467
0.00613
1.12
7.65e-05
-0.417
3163
1.5
28
Male
Eastern Germany
0
6
Gruene
2.09
-0.586
0.00489
1.12
9.59e-05
-0.523
3166
3
68
Female
Western Germany
0
5
FDP
3.32
-0.325
0.00573
1.12
3.46e-05
-0.29
3167
1.75
49
Female
Eastern Germany
0
6
Gruene
2.36
-0.606
0.0041
1.12
8.58e-05
-0.54
3169
1.75
50
Male
Eastern Germany
0
6
FDP
3.35
-1.6
0.00553
1.12
0.000815
-1.43
3170
5.5
84
Female
Eastern Germany
0
8
CDU-CSU
4.09
1.41
0.00468
1.12
0.000533
1.26
3171
4.25
43
Male
Eastern Germany
0
7
AfD
4.9
-0.649
0.00774
1.12
0.000188
-0.58
3173
1.5
35
Male
Eastern Germany
0
4
Other party
2.73
-1.23
0.0145
1.12
0.00128
-1.1
3175
2
45
Female
Eastern Germany
0
6
SPD
2.7
-0.701
0.0052
1.12
0.000146
-0.626
3176
1.5
39
Female
Western Germany
1
6
CDU-CSU
2.5
-1
0.00471
1.12
0.000271
-0.896
3178
5.5
81
Female
Western Germany
0
8
CDU-CSU
3.99
1.51
0.00452
1.12
0.000587
1.35
3179
3.25
63
Female
Western Germany
0
7
SPD
3.17
0.081
0.00418
1.12
1.57e-06
0.0722
3180
1.75
44
Male
Eastern Germany
1
6
FDP
2.89
-1.14
0.00648
1.12
0.000485
-1.02
3190
6.25
33
Female
Western Germany
0
6
AfD
4.39
1.86
0.0088
1.12
0.00176
1.67
3197
3.25
23
Male
Eastern Germany
1
7
FDP
2.73
0.517
0.0083
1.12
0.000128
0.462
3200
2.5
21
Female
Western Germany
0
4
Gruene
1.42
1.08
0.00423
1.12
0.00028
0.961
3201
3
50
Female
Eastern Germany
0
7
SPD
2.99
0.00982
0.0049
1.12
2.7e-08
0.00876
3203
3.25
69
Male
Eastern Germany
0
7
CDU-CSU
3.72
-0.47
0.0038
1.12
4.79e-05
-0.419
3206
1.5
34
Male
Western Germany
1
7
Gruene
1.99
-0.488
0.0051
1.12
6.95e-05
-0.436
3207
2.5
51
Male
Western Germany
0
6
SPD
2.85
-0.352
0.00397
1.12
2.81e-05
-0.314
3210
2.5
39
Male
Western Germany
0
7
SPD
2.85
-0.348
0.00528
1.12
3.65e-05
-0.31
3211
7
67
Male
Western Germany
0
8
AfD
5.47
1.53
0.00922
1.12
0.00124
1.37
3212
7
53
Male
Eastern Germany
0
7
AfD
5.07
1.93
0.0075
1.12
0.0016
1.72
3213
5.5
74
Female
Eastern Germany
1
8
CDU-CSU
3.56
1.94
0.00548
1.12
0.00118
1.73
3214
2
30
Male
Western Germany
0
4
Gruene
1.67
0.33
0.00387
1.12
2.4e-05
0.294
3217
1.75
52
Female
Western Germany
1
8
FDP
3.3
-1.55
0.00761
1.12
0.00105
-1.38
3220
1.5
20
Male
Eastern Germany
0
8
Other party
3.28
-1.78
0.0149
1.12
0.00275
-1.6
3229
5.25
66
Male
Eastern Germany
1
8
CDU-CSU
3.51
1.74
0.00518
1.12
0.000894
1.55
3232
1.75
77
Female
Western Germany
0
8
CDU-CSU
3.92
-2.17
0.00431
1.12
0.00116
-1.94
3235
3
66
Female
Eastern Germany
0
8
Gruene
3.05
-0.0538
0.00486
1.12
8.03e-07
-0.048
3240
1.25
21
Male
Western Germany
0
5
FDP
2.61
-1.36
0.00576
1.12
0.000607
-1.21
3241
1.5
31
Female
Western Germany
0
4
Gruene
1.6
-0.095
0.00375
1.12
1.93e-06
-0.0847
3244
3
30
Female
Western Germany
0
7
SPD
2.6
0.4
0.00588
1.12
5.39e-05
0.357
3246
1
69
Female
Eastern Germany
1
8
FDP
3.64
-2.64
0.00753
1.12
0.00301
-2.36
3249
7
81
Male
Eastern Germany
0
7
AfD
5.55
1.45
0.0088
1.12
0.00106
1.29
3251
1.75
62
Male
Western Germany
0
7
CDU-CSU
3.55
-1.8
0.0033
1.12
0.000613
-1.61
3253
3
46
Female
Western Germany
0
4
CDU-CSU
2.58
0.421
0.004
1.12
4.05e-05
0.376
3256
3.5
57
Female
Eastern Germany
0
8
AfD
5.25
-1.75
0.00863
1.12
0.00152
-1.57
3257
3.25
56
Male
Western Germany
1
5
SPD
2.38
0.873
0.00501
1.12
0.000218
0.779
3258
3.25
59
Female
Western Germany
0
6
Gruene
2.48
0.767
0.00312
1.12
0.000105
0.684
3259
3.75
60
Male
Eastern Germany
0
7
Gruene
2.84
0.91
0.0044
1.12
0.000208
0.812
3260
3
83
Female
Eastern Germany
1
8
SPD
3.4
-0.403
0.00698
1.12
6.51e-05
-0.36
3261
4.75
73
Male
Western Germany
0
6
FDP
3.71
1.04
0.00549
1.12
0.000343
0.932
3262
3
32
Male
Western Germany
1
8
Gruene
2.16
0.844
0.00704
1.12
0.000288
0.754
3263
2.25
34
Female
Western Germany
0
5
Gruene
1.85
0.401
0.00308
1.12
2.82e-05
0.357
3264
2
36
Female
Western Germany
0
6
Other party
3.02
-1.02
0.0122
1.12
0.000728
-0.91
3265
4.5
83
Male
Eastern Germany
1
7
SPD
3.29
1.21
0.00649
1.12
0.000542
1.08
3269
3.25
81
Male
Western Germany
0
8
SPD
3.77
-0.524
0.00604
1.12
9.51e-05
-0.468
3271
2.25
22
Male
Western Germany
0
5
Other party
2.66
-0.414
0.0125
1.12
0.000124
-0.371
3272
2.5
79
Female
Western Germany
0
6
SPD
3.24
-0.742
0.00473
1.12
0.000149
-0.662
3279
5.5
77
Female
Western Germany
0
8
SPD
3.61
1.89
0.00548
1.12
0.00112
1.68
3281
3.75
79
Male
Western Germany
0
8
CDU-CSU
4.05
-0.3
0.00477
1.12
2.45e-05
-0.268
3286
1.75
62
Female
Western Germany
0
5
Gruene
2.33
-0.582
0.00357
1.12
6.88e-05
-0.519
3288
2.25
40
Female
Western Germany
0
7
SPD
2.77
-0.522
0.00495
1.12
7.72e-05
-0.466
3290
1.5
57
Female
Western Germany
0
6
Gruene
2.45
-0.948
0.00304
1.12
0.000156
-0.845
3293
4
53
Male
Western Germany
0
6
Gruene
2.47
1.53
0.00325
1.12
0.000433
1.36
3296
2.5
42
Male
Western Germany
0
4
CDU-CSU
2.6
-0.102
0.00395
1.12
2.34e-06
-0.0909
3297
4
79
Male
Eastern Germany
0
8
CDU-CSU
4.1
-0.0952
0.00451
1.12
2.33e-06
-0.0849
3299
5.5
33
Female
Eastern Germany
0
7
CDU-CSU
3.01
2.49
0.00504
1.12
0.00179
2.22
3301
2.5
82
Male
Western Germany
1
8
Linke
3.17
-0.669
0.0116
1.12
0.0003
-0.599
3302
3
38
Male
Western Germany
0
5
Other party
2.94
0.06
0.0119
1.12
2.49e-06
0.0538
3303
2.75
27
Male
Western Germany
0
4
Would not vote
2.78
-0.0254
0.0113
1.12
4.23e-07
-0.0227
3304
1.5
70
Male
Western Germany
0
4
SPD
2.77
-1.27
0.00573
1.12
0.000533
-1.14
3305
2.5
75
Female
Western Germany
0
8
FDP
4.05
-1.55
0.00666
1.12
0.000921
-1.39
3307
2.25
56
Female
Western Germany
0
7
CDU-CSU
3.36
-1.11
0.00309
1.12
0.000216
-0.988
3308
4.25
73
Male
Eastern Germany
0
8
SPD
3.68
0.568
0.00535
1.12
9.88e-05
0.507
3315
3.75
67
Male
Western Germany
1
6
AfD
4.71
-0.957
0.00973
1.12
0.000514
-0.856
3316
3.75
78
Female
Eastern Germany
0
8
CDU-CSU
3.99
-0.236
0.00432
1.12
1.37e-05
-0.21
3318
3.5
46
Female
Western Germany
0
4
CDU-CSU
2.58
0.921
0.004
1.12
0.000194
0.822
3320
2.25
68
Male
Western Germany
0
6
Gruene
2.73
-0.48
0.00396
1.12
5.21e-05
-0.428
3321
5.5
78
Male
Western Germany
0
8
FDP
4.2
1.3
0.00702
1.12
0.000684
1.16
3323
3
77
Male
Western Germany
0
5
SPD
3.1
-0.0978
0.00516
1.12
2.83e-06
-0.0873
3324
2.25
80
Male
Western Germany
1
6
FDP
3.47
-1.22
0.00693
1.12
0.00059
-1.09
3325
2.25
44
Female
Eastern Germany
0
7
FDP
3.36
-1.11
0.0058
1.12
0.00041
-0.992
3328
3.25
63
Male
Western Germany
0
6
FDP
3.53
-0.284
0.00484
1.12
2.22e-05
-0.253
3330
2.5
62
Male
Western Germany
1
5
Gruene
2.07
0.434
0.00403
1.12
4.33e-05
0.387
3331
2.75
53
Female
Eastern Germany
0
6
AfD
4.78
-2.03
0.00865
1.12
0.00205
-1.81
3332
1.75
53
Male
Western Germany
0
5
Gruene
2.27
-0.519
0.00329
1.12
5.06e-05
-0.463
3333
1.25
63
Male
Western Germany
1
6
SPD
2.7
-1.45
0.00494
1.12
0.000594
-1.29
3334
1.75
79
Male
Western Germany
1
7
Gruene
2.76
-1.01
0.00562
1.12
0.000331
-0.905
3337
1
41
Male
Eastern Germany
1
5
CDU-CSU
2.47
-1.47
0.00588
1.12
0.000732
-1.32
3338
2
62
Male
Western Germany
0
7
SPD
3.24
-1.24
0.00442
1.12
0.00039
-1.11
3340
5.25
66
Male
Eastern Germany
0
7
AfD
5.3
-0.0459
0.00775
1.12
9.38e-07
-0.041
3342
3.25
29
Male
Western Germany
0
7
SPD
2.68
0.575
0.00627
1.12
0.000119
0.513
3343
1.75
33
Male
Eastern Germany
0
5
Linke
2.12
-0.37
0.00854
1.12
6.75e-05
-0.331
3344
2.75
72
Female
Western Germany
0
4
SPD
2.72
0.0332
0.00604
1.12
3.82e-07
0.0297
3346
3
70
Female
Western Germany
0
7
Gruene
2.87
0.125
0.0041
1.12
3.66e-06
0.112
3348
3
79
Female
Western Germany
0
6
SPD
3.24
-0.242
0.00473
1.12
1.59e-05
-0.216
3353
1.5
19
Female
Eastern Germany
0
5
Gruene
1.64
-0.136
0.00585
1.12
6.19e-06
-0.121
3356
6
28
Male
Eastern Germany
0
6
SPD
2.5
3.5
0.00634
1.12
0.00445
3.12
3357
1.5
31
Female
Western Germany
0
6
Would not vote
3.16
-1.66
0.0106
1.12
0.00168
-1.48
3358
5
52
Male
Western Germany
0
6
Other party
3.38
1.62
0.012
1.12
0.00181
1.45
3360
2.75
53
Male
Western Germany
0
5
CDU-CSU
2.99
-0.244
0.00303
1.12
1.03e-05
-0.218
3363
6.25
78
Male
Western Germany
0
8
FDP
4.2
2.05
0.00702
1.12
0.0017
1.83
3367
3.25
79
Female
Eastern Germany
0
8
Linke
3.43
-0.179
0.00873
1.12
1.6e-05
-0.16
3371
1.75
55
Female
Eastern Germany
0
7
CDU-CSU
3.39
-1.64
0.00371
1.12
0.000566
-1.46
3374
1.5
39
Female
Western Germany
0
5
Gruene
1.94
-0.435
0.00296
1.12
3.19e-05
-0.388
3375
1.5
75
Female
Western Germany
0
8
SPD
3.58
-2.08
0.0054
1.12
0.00133
-1.86
3377
1.5
23
Male
Western Germany
0
5
Gruene
1.75
-0.252
0.0039
1.12
1.41e-05
-0.225
3380
5.25
68
Female
Western Germany
0
8
FDP
3.93
1.32
0.00632
1.12
0.000628
1.18
3383
2
34
Male
Western Germany
0
4
FDP
2.63
-0.629
0.00548
1.12
0.000124
-0.561
3385
1.75
21
Female
Western Germany
0
5
Gruene
1.63
0.125
0.00383
1.12
3.41e-06
0.111
3387
6.5
67
Female
Eastern Germany
0
8
CDU-CSU
3.8
2.7
0.00401
1.12
0.00167
2.41
3390
2.75
42
Female
Western Germany
0
8
FDP
3.48
-0.734
0.00661
1.12
0.000204
-0.656
3397
7
54
Male
Eastern Germany
0
8
Would not vote
4.1
2.9
0.0109
1.12
0.00532
2.6
3399
2
57
Male
Eastern Germany
0
6
Gruene
2.59
-0.586
0.00436
1.12
8.54e-05
-0.523
3403
6
57
Male
Western Germany
1
7
AfD
4.74
1.26
0.00981
1.12
0.000903
1.13
3404
6.25
68
Female
Eastern Germany
0
8
CDU-CSU
3.81
2.44
0.00402
1.12
0.00136
2.17
3405
2.25
51
Male
Western Germany
0
5
Gruene
2.23
0.0153
0.00323
1.12
4.29e-08
0.0136
3407
3.5
66
Female
Eastern Germany
0
8
Would not vote
4.21
-0.711
0.0108
1.12
0.000315
-0.636
3408
2.5
54
Male
Western Germany
0
4
CDU-CSU
2.81
-0.309
0.00393
1.12
2.14e-05
-0.275
3417
2.75
48
Female
Western Germany
0
5
Gruene
2.09
0.659
0.00296
1.12
7.34e-05
0.588
3420
2.5
79
Male
Western Germany
1
8
Gruene
2.97
-0.466
0.0067
1.12
8.36e-05
-0.417
3422
1.75
34
Female
Eastern Germany
0
4
Gruene
1.69
0.0579
0.00618
1.12
1.19e-06
0.0517
3423
2.5
67
Female
Western Germany
0
8
Linke
3.18
-0.676
0.00962
1.12
0.000254
-0.605
3425
2.25
45
Male
Eastern Germany
0
6
FDP
3.27
-1.02
0.00557
1.12
0.000331
-0.909
3426
1.25
37
Male
Eastern Germany
0
7
Gruene
2.44
-1.19
0.00466
1.12
0.000379
-1.06
3427
3.75
23
Female
Western Germany
0
7
Would not vote
3.22
0.529
0.0122
1.12
0.000197
0.473
3429
3.25
32
Male
Eastern Germany
0
4
Would not vote
2.91
0.343
0.0128
1.12
8.78e-05
0.307
3432
2
71
Male
Western Germany
0
4
Gruene
2.38
-0.377
0.00554
1.12
4.51e-05
-0.337
3434
2
29
Female
Western Germany
0
4
FDP
2.45
-0.45
0.00597
1.12
6.92e-05
-0.402
3437
1.5
33
Male
Western Germany
0
6
Gruene
2.13
-0.627
0.0036
1.12
8.06e-05
-0.559
3440
1.5
49
Female
Western Germany
0
5
Gruene
2.11
-0.608
0.00298
1.12
6.28e-05
-0.542
3443
2.75
58
Male
Western Germany
0
5
SPD
2.77
-0.0202
0.00412
1.12
9.62e-08
-0.018
3444
3.25
50
Female
Eastern Germany
0
7
CDU-CSU
3.3
-0.0503
0.00385
1.12
5.55e-07
-0.0448
3445
2
64
Female
Western Germany
1
5
CDU-CSU
2.73
-0.733
0.00448
1.12
0.000137
-0.654
3449
2.25
58
Male
Western Germany
1
5
Linke
2.15
0.102
0.0088
1.12
5.32e-06
0.0916
3450
3.25
59
Female
Eastern Germany
0
8
SPD
3.35
-0.0978
0.00514
1.12
2.82e-06
-0.0873
3451
2.5
56
Male
Eastern Germany
0
8
CDU-CSU
3.7
-1.2
0.00429
1.12
0.000352
-1.07
3453
1.5
27
Male
Western Germany
0
5
Gruene
1.82
-0.321
0.00363
1.12
2.13e-05
-0.286
3456
1
59
Male
Eastern Germany
0
5
SPD
2.83
-1.83
0.00574
1.12
0.0011
-1.64
3458
2.5
44
Female
Western Germany
1
6
CDU-CSU
2.59
-0.0905
0.0044
1.12
2.06e-06
-0.0807
3461
3
64
Female
Eastern Germany
0
7
SPD
3.23
-0.232
0.00473
1.12
1.45e-05
-0.207
3465
6.25
61
Male
Western Germany
0
7
AfD
5.16
1.09
0.00807
1.12
0.000547
0.97
3467
4
58
Male
Western Germany
1
6
CDU-CSU
2.92
1.08
0.00383
1.12
0.000253
0.959
3470
1.5
23
Male
Western Germany
1
5
FDP
2.28
-0.783
0.00659
1.12
0.000232
-0.699
3472
3
66
Male
Western Germany
1
7
SPD
2.95
0.0454
0.00548
1.12
6.46e-07
0.0405
3477
1.25
31
Male
Western Germany
1
6
SPD
2.15
-0.899
0.00626
1.12
0.00029
-0.802
3479
1
23
Female
Western Germany
0
6
SPD
2.28
-1.28
0.00584
1.12
0.000545
-1.14
3483
3
57
Female
Western Germany
0
7
CDU-CSU
3.38
-0.376
0.00307
1.12
2.47e-05
-0.335
3490
2.25
57
Male
Eastern Germany
1
8
FDP
3.52
-1.27
0.00699
1.12
0.000649
-1.14
3492
4
42
Male
Western Germany
0
5
AfD
4.43
-0.432
0.0078
1.12
8.37e-05
-0.386
3493
3.25
44
Female
Eastern Germany
0
7
FDP
3.36
-0.111
0.0058
1.12
4.12e-06
-0.0995
3500
2.25
58
Female
Western Germany
0
6
SPD
2.88
-0.63
0.0038
1.12
8.61e-05
-0.562
3502
2.75
79
Female
Western Germany
0
7
FDP
3.92
-1.17
0.00619
1.12
0.000485
-1.04
3504
4.5
57
Male
Western Germany
1
5
FDP
2.87
1.63
0.00565
1.12
0.000861
1.46
3507
4.25
81
Female
Eastern Germany
0
8
CDU-CSU
4.04
0.213
0.00449
1.12
1.16e-05
0.19
3511
2.5
56
Female
Western Germany
0
4
Gruene
2.03
0.474
0.00415
1.12
5.31e-05
0.423
3516
1.25
58
Female
Western Germany
1
6
Gruene
2.11
-0.857
0.00379
1.12
0.000159
-0.764
3519
2.5
61
Male
Western Germany
0
5
CDU-CSU
3.13
-0.632
0.00316
1.12
7.18e-05
-0.563
3522
7
82
Male
Eastern Germany
0
8
SPD
3.84
3.16
0.00577
1.12
0.00331
2.82
3523
3.5
58
Male
Eastern Germany
1
7
SPD
2.86
0.638
0.00572
1.12
0.000133
0.57
3526
1.5
54
Female
Western Germany
0
5
Gruene
2.19
-0.694
0.00313
1.12
8.6e-05
-0.619
3531
2.25
64
Male
Western Germany
1
5
CDU-CSU
2.83
-0.575
0.00414
1.12
7.83e-05
-0.513
3533
3.5
78
Male
Eastern Germany
0
7
SPD
3.57
-0.0654
0.00527
1.12
1.29e-06
-0.0583
3534
1.75
53
Female
Eastern Germany
0
7
Gruene
2.63
-0.877
0.00406
1.12
0.000178
-0.782
3535
1.5
33
Male
Western Germany
0
6
FDP
3.02
-1.52
0.00507
1.12
0.000666
-1.35
3538
2
71
Male
Western Germany
0
4
CDU-CSU
3.1
-1.1
0.0048
1.12
0.000333
-0.983
3539
2.75
45
Male
Western Germany
0
5
CDU-CSU
2.86
-0.106
0.00314
1.12
2.01e-06
-0.0946
3540
2.25
27
Male
Western Germany
0
4
AfD
3.97
-1.72
0.00906
1.12
0.00155
-1.54
3541
2.75
61
Female
Western Germany
1
6
Gruene
2.16
0.591
0.00391
1.12
7.79e-05
0.527
3542
2
31
Male
Western Germany
1
5
FDP
2.42
-0.421
0.00599
1.12
6.08e-05
-0.376
3544
5.25
54
Male
Eastern Germany
0
7
AfD
5.09
0.161
0.0075
1.12
1.12e-05
0.144
3546
2
58
Male
Western Germany
0
4
Gruene
2.15
-0.153
0.00434
1.12
5.8e-06
-0.136
3549
4.75
52
Female
Western Germany
1
6
CDU-CSU
2.73
2.02
0.00411
1.12
0.000958
1.8
3550
3
80
Male
Western Germany
0
6
CDU-CSU
3.66
-0.662
0.00382
1.12
9.56e-05
-0.591
3553
2.5
51
Male
Western Germany
0
8
Gruene
2.84
-0.342
0.00535
1.12
3.59e-05
-0.305
3554
4.25
82
Female
Western Germany
0
6
CDU-CSU
3.6
0.646
0.0039
1.12
9.26e-05
0.576
3560
2.5
66
Female
Western Germany
0
6
CDU-CSU
3.33
-0.828
0.00287
1.12
0.000112
-0.738
3565
4
79
Male
Eastern Germany
0
8
Linke
3.52
0.479
0.00895
1.12
0.000118
0.428
3566
3.5
62
Male
Western Germany
0
8
Gruene
3.03
0.468
0.00538
1.12
6.74e-05
0.418
3567
2.5
41
Female
Eastern Germany
1
6
Gruene
1.86
0.641
0.0049
1.12
0.000115
0.572
3571
2.25
73
Female
Eastern Germany
1
7
SPD
3.03
-0.778
0.00624
1.12
0.000217
-0.695
3581
3
54
Female
Eastern Germany
0
7
Linke
2.8
0.205
0.00745
1.12
1.8e-05
0.183
3582
4.75
74
Female
Western Germany
1
5
SPD
2.6
2.15
0.00608
1.12
0.00162
1.92
3584
1.75
27
Female
Western Germany
0
5
Gruene
1.73
0.0215
0.00341
1.12
8.96e-08
0.0191
3585
1.25
29
Male
Western Germany
1
6
Linke
1.85
-0.6
0.00973
1.12
0.000202
-0.537
3588
2.5
34
Female
Western Germany
0
5
Gruene
1.85
0.651
0.00308
1.12
7.43e-05
0.58
3595
4.5
49
Male
Eastern Germany
0
6
AfD
4.8
-0.3
0.00771
1.12
4e-05
-0.268
3596
3
36
Female
Western Germany
0
5
AfD
4.24
-1.24
0.00877
1.12
0.000772
-1.1
3600
2.75
33
Male
Eastern Germany
0
7
FDP
3.26
-0.514
0.00625
1.12
9.47e-05
-0.459
3604
2
63
Male
Eastern Germany
0
8
CDU-CSU
3.82
-1.82
0.00415
1.12
0.000784
-1.62
3605
5
56
Male
Western Germany
0
4
CDU-CSU
2.84
2.16
0.00398
1.12
0.00106
1.92
3608
4
44
Female
Western Germany
0
5
CDU-CSU
2.75
1.25
0.00315
1.12
0.000282
1.12
3609
2.25
25
Female
Western Germany
0
7
CDU-CSU
2.82
-0.574
0.00538
1.12
0.000101
-0.512
3612
2
58
Female
Western Germany
1
5
Gruene
1.9
0.0955
0.00395
1.12
2.05e-06
0.0851
3614
2
31
Male
Western Germany
0
5
CDU-CSU
2.61
-0.615
0.00389
1.12
8.39e-05
-0.548
3619
2
27
Male
Western Germany
1
5
CDU-CSU
2.19
-0.187
0.00533
1.12
1.07e-05
-0.167
3625
2.25
50
Female
Western Germany
0
6
SPD
2.74
-0.492
0.00387
1.12
5.35e-05
-0.439
3626
2.5
40
Female
Western Germany
0
4
CDU-CSU
2.48
0.0249
0.00412
1.12
1.46e-07
0.0222
3627
3.25
51
Female
Western Germany
0
5
Gruene
2.14
1.11
0.00303
1.12
0.000212
0.987
3631
3
31
Male
Western Germany
1
6
CDU-CSU
2.46
0.541
0.00521
1.12
8.73e-05
0.483
3632
2.5
33
Female
Western Germany
0
6
CDU-CSU
2.76
-0.259
0.00373
1.12
1.43e-05
-0.231
3634
3.25
55
Male
Western Germany
0
4
CDU-CSU
2.83
0.424
0.00395
1.12
4.05e-05
0.378
3635
2.5
45
Male
Western Germany
1
4
CDU-CSU
2.3
0.205
0.00481
1.12
1.15e-05
0.183
3637
1.5
35
Female
Western Germany
0
5
Gruene
1.87
-0.366
0.00305
1.12
2.33e-05
-0.327
3648
2
51
Male
Eastern Germany
0
8
Would not vote
4.04
-2.04
0.011
1.12
0.00265
-1.83
3652
3
20
Male
Western Germany
1
8
FDP
2.84
0.161
0.0103
1.12
1.54e-05
0.144
3653
3.25
80
Female
Western Germany
0
8
CDU-CSU
3.97
-0.725
0.00446
1.12
0.000134
-0.647
3655
1
62
Male
Eastern Germany
0
8
SPD
3.49
-2.49
0.00524
1.12
0.00186
-2.22
3660
1.75
32
Female
Western Germany
1
6
Gruene
1.66
0.0913
0.00417
1.12
1.98e-06
0.0814
3664
6
47
Male
Western Germany
0
5
AfD
4.52
1.48
0.00777
1.12
0.000981
1.32
3666
4
56
Female
Western Germany
0
6
SPD
2.85
1.15
0.0038
1.12
0.000288
1.03
3667
2.5
39
Female
Western Germany
0
4
FDP
2.62
-0.122
0.00569
1.12
4.89e-06
-0.109
3668
1.25
65
Male
Western Germany
1
6
CDU-CSU
3.04
-1.79
0.00391
1.12
0.000719
-1.6
3669
1.75
38
Female
Western Germany
0
5
FDP
2.81
-1.06
0.00492
1.12
0.000315
-0.944
3674
1.25
41
Female
Western Germany
1
8
Gruene
2.22
-0.969
0.0061
1.12
0.000328
-0.865
3678
1.25
22
Male
Western Germany
1
7
Linke
1.93
-0.682
0.0116
1.12
0.000313
-0.61
3685
7
70
Male
Eastern Germany
1
8
Linke
3.01
3.99
0.00913
1.12
0.00839
3.57
3687
2.75
58
Female
Eastern Germany
0
6
CDU-CSU
3.24
-0.486
0.00396
1.12
5.34e-05
-0.433
3691
2.5
47
Male
Eastern Germany
1
7
Linke
2.41
0.0918
0.00842
1.12
4.09e-06
0.0821
3692
3.5
57
Female
Eastern Germany
0
8
SPD
3.31
0.187
0.00519
1.12
1.03e-05
0.167
3695
3.75
45
Male
Eastern Germany
0
7
Gruene
2.58
1.17
0.00435
1.12
0.000339
1.04
3696
4.75
61
Male
Eastern Germany
0
8
Linke
3.21
1.54
0.00824
1.12
0.00112
1.38
3703
1.25
40
Female
Western Germany
1
5
SPD
2.01
-0.759
0.00569
1.12
0.000188
-0.678
3706
1
34
Female
Eastern Germany
0
6
Gruene
2.1
-1.1
0.00441
1.12
0.000303
-0.979
3708
2
33
Male
Western Germany
0
6
CDU-CSU
2.85
-0.852
0.00388
1.12
0.00016
-0.76
3710
3.5
61
Male
Western Germany
0
7
Other party
3.74
-0.242
0.0128
1.12
4.32e-05
-0.216
3711
1.75
43
Female
Western Germany
0
4
CDU-CSU
2.53
-0.777
0.00404
1.12
0.000139
-0.693
3712
1.75
33
Female
Western Germany
0
5
SPD
2.25
-0.497
0.00475
1.12
6.7e-05
-0.443
3714
3
70
Male
Eastern Germany
0
5
CDU-CSU
3.33
-0.333
0.00526
1.12
3.33e-05
-0.297
3717
1.5
36
Male
Eastern Germany
0
7
Other party
3.36
-1.86
0.0126
1.12
0.00253
-1.66
3718
1.75
71
Female
Western Germany
0
7
Gruene
2.89
-1.14
0.00417
1.12
0.00031
-1.02
3719
3.5
73
Male
Western Germany
0
4
CDU-CSU
3.14
0.364
0.00497
1.12
3.76e-05
0.324
3723
3.25
70
Female
Western Germany
0
8
SPD
3.49
-0.242
0.00526
1.12
1.76e-05
-0.216
3726
2.25
48
Female
Western Germany
0
6
Other party
3.22
-0.972
0.0121
1.12
0.000663
-0.871
3735
1.5
45
Male
Western Germany
0
5
Gruene
2.13
-0.631
0.00313
1.12
7.11e-05
-0.563
3736
2.5
78
Female
Western Germany
0
8
Would not vote
4.37
-1.87
0.0119
1.12
0.00242
-1.68
3738
5
53
Male
Western Germany
0
5
AfD
4.62
0.379
0.00785
1.12
6.47e-05
0.338
3744
2
71
Female
Eastern Germany
0
8
Gruene
3.14
-1.14
0.0051
1.12
0.000379
-1.02
3747
2.5
60
Male
Eastern Germany
0
6
SPD
3.05
-0.553
0.00488
1.12
8.52e-05
-0.493
3748
2
28
Female
Western Germany
0
6
Gruene
1.95
0.0518
0.00357
1.12
5.44e-07
0.0461
3749
1.75
60
Male
Western Germany
1
5
Gruene
2.03
-0.281
0.00391
1.12
1.77e-05
-0.251
3751
1
61
Female
Eastern Germany
1
6
Gruene
2.2
-1.2
0.00507
1.12
0.00042
-1.07
3753
3.25
67
Female
Eastern Germany
0
8
CDU-CSU
3.8
-0.546
0.00401
1.12
6.81e-05
-0.487
3754
4.75
58
Male
Western Germany
1
5
Other party
2.93
1.82
0.0135
1.12
0.00261
1.63
3755
2.75
47
Male
Western Germany
1
6
CDU-CSU
2.73
0.0154
0.00407
1.12
5.5e-08
0.0137
3756
3.25
56
Female
Western Germany
0
7
SPD
3.05
0.202
0.00421
1.12
9.78e-06
0.18
3758
3.5
23
Female
Western Germany
0
6
Other party
2.79
0.709
0.0128
1.12
0.000375
0.635
3759
1.25
47
Female
Western Germany
0
7
CDU-CSU
3.2
-1.95
0.00339
1.12
0.000738
-1.74
3762
1.5
72
Male
Eastern Germany
1
6
SPD
2.9
-1.4
0.00614
1.12
0.000691
-1.25
3765
2
54
Male
Eastern Germany
0
6
Would not vote
3.69
-1.69
0.0104
1.12
0.00172
-1.51
3766
2.25
61
Female
Western Germany
0
6
CDU-CSU
3.24
-0.992
0.00275
1.12
0.000154
-0.884
3771
5.25
67
Male
Western Germany
0
7
CDU-CSU
3.64
1.61
0.00337
1.12
0.000497
1.44
3780
3.75
68
Male
Western Germany
0
7
AfD
5.29
-1.54
0.00833
1.12
0.00113
-1.37
3781
1
74
Male
Western Germany
0
7
Gruene
3.04
-2.04
0.00483
1.12
0.00114
-1.82
3782
4.75
53
Female
Eastern Germany
0
7
AfD
4.98
-0.229
0.0083
1.12
2.51e-05
-0.205
3784
5.5
57
Female
Western Germany
0
8
Other party
3.78
1.72
0.0137
1.12
0.00235
1.54
3789
1.75
27
Female
Western Germany
0
6
Gruene
1.93
-0.181
0.00364
1.12
6.79e-06
-0.161
3790
1.75
70
Female
Western Germany
0
6
CDU-CSU
3.4
-1.65
0.00304
1.12
0.00047
-1.47
3791
4
68
Female
Eastern Germany
0
6
Linke
2.83
1.17
0.00811
1.12
0.000634
1.04
3792
3
48
Male
Western Germany
0
4
FDP
2.87
0.13
0.00543
1.12
5.25e-06
0.116
3794
3.75
73
Female
Eastern Germany
0
7
Would not vote
4.13
-0.379
0.0109
1.12
9.02e-05
-0.339
3796
6
59
Male
Eastern Germany
0
6
AfD
4.97
1.03
0.00785
1.12
0.000476
0.918
3797
1
68
Male
Eastern Germany
0
7
SPD
3.39
-2.39
0.00482
1.12
0.00158
-2.14
3798
2.5
68
Female
Western Germany
0
7
CDU-CSU
3.57
-1.07
0.00315
1.12
0.000203
-0.95
3800
2
60
Male
Western Germany
0
7
SPD
3.21
-1.21
0.00442
1.12
0.000369
-1.08
3804
2.5
56
Female
Western Germany
1
6
CDU-CSU
2.8
-0.297
0.00405
1.12
2.04e-05
-0.265
3805
5.75
60
Female
Western Germany
1
6
FDP
3.03
2.72
0.006
1.12
0.00254
2.43
3806
5
79
Male
Eastern Germany
0
7
CDU-CSU
3.89
1.11
0.00428
1.12
0.0003
0.988
3809
7
78
Female
Western Germany
0
6
Would not vote
3.97
3.03
0.0111
1.12
0.00591
2.71
3811
4.25
69
Male
Eastern Germany
0
7
CDU-CSU
3.72
0.53
0.0038
1.12
6.08e-05
0.472
3813
1.5
59
Male
Western Germany
0
7
Gruene
2.78
-1.28
0.00402
1.12
0.000375
-1.14
3814
4.25
48
Female
Western Germany
0
7
CDU-CSU
3.22
1.03
0.00334
1.12
0.000202
0.918
3816
5.5
40
Male
Western Germany
0
7
Other party
3.38
2.12
0.0126
1.12
0.00328
1.9
3826
1
36
Female
Western Germany
1
5
Would not vote
2.68
-1.68
0.0126
1.12
0.00207
-1.51
3827
1.75
28
Male
Western Germany
1
5
CDU-CSU
2.2
-0.455
0.00523
1.12
6.18e-05
-0.406
3829
3.75
72
Male
Eastern Germany
0
7
CDU-CSU
3.77
-0.022
0.00391
1.12
1.08e-07
-0.0196
3830
2
41
Male
Western Germany
0
6
Gruene
2.26
-0.265
0.00328
1.12
1.31e-05
-0.236
3831
6.25
67
Male
Eastern Germany
0
8
AfD
5.52
0.734
0.00808
1.12
0.000251
0.656
3836
3.25
18
Male
Western Germany
1
6
Gruene
1.51
1.74
0.00542
1.12
0.00094
1.55
3837
2
55
Male
Western Germany
1
7
FDP
3.24
-1.24
0.00607
1.12
0.000535
-1.11
3839
2.25
30
Male
Western Germany
1
5
CDU-CSU
2.24
0.011
0.00505
1.12
3.49e-08
0.00981
3840
2
31
Male
Eastern Germany
0
5
Gruene
1.94
0.0648
0.00504
1.12
1.21e-06
0.0578
3842
4
70
Female
Eastern Germany
0
8
CDU-CSU
3.85
0.152
0.00405
1.12
5.37e-06
0.136
3844
1.5
38
Male
Eastern Germany
0
6
Gruene
2.26
-0.758
0.00436
1.12
0.000143
-0.677
3846
1.75
52
Female
Western Germany
1
7
Gruene
2.21
-0.456
0.0043
1.12
5.11e-05
-0.407
3851
3.75
40
Female
Western Germany
0
8
Gruene
2.56
1.19
0.00519
1.12
0.00042
1.06
3854
1.25
45
Female
Western Germany
1
4
Gruene
1.48
-0.228
0.00432
1.12
1.28e-05
-0.203
3857
1.5
42
Female
Western Germany
0
6
Gruene
2.19
-0.69
0.00293
1.12
7.93e-05
-0.615
3858
2
71
Male
Western Germany
1
7
CDU-CSU
3.35
-1.35
0.00448
1.12
0.000467
-1.21
3862
1.25
27
Male
Eastern Germany
1
6
Linke
1.86
-0.611
0.00937
1.12
0.000202
-0.546
3863
1.5
88
Male
Western Germany
0
5
Would not vote
4.03
-2.53
0.013
1.12
0.00485
-2.27
3865
2.5
64
Female
Western Germany
0
6
SPD
2.98
-0.484
0.0039
1.12
5.21e-05
-0.431
3866
2.75
52
Female
Western Germany
0
5
Gruene
2.16
0.59
0.00306
1.12
6.08e-05
0.526
3867
1.75
27
Male
Western Germany
1
7
SPD
2.28
-0.532
0.00775
1.12
0.000126
-0.476
3869
2.25
23
Female
Western Germany
1
4
Gruene
1.1
1.15
0.00486
1.12
0.000368
1.03
3871
6.5
64
Female
Eastern Germany
0
6
AfD
4.97
1.53
0.00899
1.12
0.00122
1.37
3877
2
23
Female
Western Germany
0
6
Gruene
1.86
0.138
0.00397
1.12
4.31e-06
0.123
3879
4.25
49
Female
Western Germany
0
4
FDP
2.79
1.46
0.00578
1.12
0.000701
1.3
3880
3
19
Male
Eastern Germany
0
6
FDP
2.82
0.18
0.00727
1.12
1.35e-05
0.161
3882
2
69
Female
Western Germany
1
5
SPD
2.51
-0.509
0.00576
1.12
8.55e-05
-0.454
3883
2.5
82
Female
Western Germany
0
5
FDP
3.57
-1.07
0.00723
1.12
0.000472
-0.953
3885
4
66
Female
Eastern Germany
1
7
CDU-CSU
3.22
0.782
0.005
1.12
0.000175
0.698
3886
2.25
67
Female
Eastern Germany
1
6
SPD
2.72
-0.472
0.00639
1.12
8.17e-05
-0.422
3888
2.5
44
Female
Western Germany
1
4
FDP
2.35
0.15
0.00683
1.12
8.8e-06
0.134
3889
3.25
54
Male
Eastern Germany
0
8
CDU-CSU
3.66
-0.414
0.00436
1.12
4.27e-05
-0.369
3892
2
42
Female
Eastern Germany
0
7
Gruene
2.44
-0.437
0.00421
1.12
4.6e-05
-0.39
3897
2.75
20
Female
Western Germany
0
7
Other party
2.94
-0.192
0.0139
1.12
3e-05
-0.172
3902
3.25
77
Male
Eastern Germany
0
5
Linke
2.88
0.371
0.00987
1.12
7.84e-05
0.332
3903
4.5
33
Female
Eastern Germany
0
7
AfD
4.63
-0.134
0.00912
1.12
9.51e-06
-0.12
3907
2.25
27
Female
Western Germany
1
6
SPD
1.99
0.263
0.00688
1.12
2.72e-05
0.235
3914
6
85
Female
Western Germany
0
8
FDP
4.23
1.77
0.00746
1.12
0.00135
1.59
3919
1.25
46
Male
Eastern Germany
0
7
Gruene
2.6
-1.35
0.00433
1.12
0.00045
-1.2
3920
3.5
57
Male
Western Germany
0
6
Gruene
2.54
0.959
0.00336
1.12
0.000176
0.855
3926
3
59
Male
Eastern Germany
0
5
CDU-CSU
3.14
-0.143
0.00478
1.12
5.57e-06
-0.127
3931
3
66
Female
Eastern Germany
1
6
Linke
2.44
0.559
0.00887
1.12
0.00016
0.5
3933
5
47
Female
Western Germany
0
5
Would not vote
3.23
1.77
0.0101
1.12
0.00182
1.58
3935
1.5
31
Female
Western Germany
1
5
Gruene
1.44
0.061
0.00399
1.12
8.47e-07
0.0544
3936
2.75
66
Male
Western Germany
0
7
SPD
3.31
-0.563
0.00446
1.12
8.08e-05
-0.502
3937
2
32
Male
Western Germany
0
6
Gruene
2.11
-0.11
0.00365
1.12
2.5e-06
-0.0977
3939
2
44
Male
Western Germany
0
4
Linke
2.06
-0.0622
0.00865
1.12
1.93e-06
-0.0556
3942
6.25
72
Male
Eastern Germany
0
8
Would not vote
4.41
1.84
0.0111
1.12
0.00218
1.65
3950
1
53
Female
Western Germany
1
6
Gruene
2.02
-1.02
0.00367
1.12
0.000218
-0.91
3954
2.5
83
Male
Eastern Germany
0
7
Linke
3.39
-0.887
0.009
1.12
0.000408
-0.794
3955
1.5
33
Female
Western Germany
1
6
Gruene
1.68
-0.176
0.00411
1.12
7.26e-06
-0.157
3957
3
43
Female
Western Germany
0
6
FDP
3.1
-0.0964
0.00469
1.12
2.49e-06
-0.086
3958
4.25
68
Female
Western Germany
0
7
FDP
3.73
0.52
0.0054
1.12
8.36e-05
0.464
3959
4.5
49
Male
Western Germany
0
5
AfD
4.55
-0.0525
0.00778
1.12
1.23e-06
-0.0469
3960
2.25
27
Female
Western Germany
0
6
Gruene
1.93
0.319
0.00364
1.12
2.11e-05
0.284
3965
3.5
40
Male
Eastern Germany
0
5
Other party
3.02
0.48
0.0131
1.12
0.000176
0.43
3974
2.25
23
Female
Western Germany
0
4
CDU-CSU
2.18
0.0681
0.00516
1.12
1.37e-06
0.0607
3978
5.5
86
Male
Western Germany
0
7
SPD
3.66
1.84
0.00558
1.12
0.00108
1.64
3979
4
76
Female
Eastern Germany
1
8
CDU-CSU
3.59
0.407
0.00554
1.12
5.27e-05
0.364
3982
3.75
40
Male
Western Germany
0
8
FDP
3.54
0.208
0.00693
1.12
1.72e-05
0.186
3983
2.25
39
Male
Eastern Germany
0
6
Gruene
2.28
-0.0256
0.00432
1.12
1.62e-07
-0.0229
3987
6.5
79
Female
Western Germany
0
8
AfD
5.58
0.915
0.0103
1.12
0.000499
0.819
3990
2
38
Female
Western Germany
0
5
Linke
2.07
-0.0688
0.00803
1.12
2.19e-06
-0.0615
3991
2
30
Female
Western Germany
0
5
Gruene
1.78
0.22
0.00325
1.12
8.93e-06
0.196
3993
5.5
58
Male
Western Germany
0
8
Would not vote
4.12
1.38
0.0117
1.12
0.00129
1.24
3999
1.75
49
Male
Western Germany
0
6
CDU-CSU
3.13
-1.38
0.00295
1.12
0.000319
-1.23
4004
2
38
Female
Western Germany
1
4
Gruene
1.36
0.643
0.0043
1.12
0.000101
0.573
4008
2.75
54
Male
Western Germany
0
7
CDU-CSU
3.42
-0.666
0.00339
1.12
8.58e-05
-0.594
4009
2.75
75
Male
Eastern Germany
0
8
Linke
3.45
-0.702
0.00869
1.12
0.000247
-0.628
4014
2
63
Male
Western Germany
1
6
CDU-CSU
3.01
-1.01
0.00387
1.12
0.000226
-0.901
4017
1.75
23
Male
Western Germany
0
7
Other party
3.09
-1.34
0.0136
1.12
0.00141
-1.2
4018
3.25
60
Female
Western Germany
0
5
SPD
2.71
0.538
0.00418
1.12
6.9e-05
0.48
4023
1.25
29
Female
Western Germany
0
6
SPD
2.38
-1.13
0.00517
1.12
0.000378
-1.01
4025
2.5
69
Male
Eastern Germany
0
7
SPD
3.41
-0.91
0.00485
1.12
0.000229
-0.812
4027
3
65
Female
Western Germany
0
7
FDP
3.68
-0.678
0.00527
1.12
0.000139
-0.605
4032
3
52
Male
Eastern Germany
0
8
Linke
3.06
-0.0554
0.00833
1.12
1.47e-06
-0.0495
4035
1.5
42
Male
Western Germany
1
4
Gruene
1.52
-0.0186
0.00403
1.12
7.93e-08
-0.0166
4036
1
43
Male
Western Germany
0
4
CDU-CSU
2.62
-1.62
0.00393
1.12
0.000588
-1.44
4039
5.75
69
Male
Eastern Germany
0
8
AfD
5.55
0.2
0.00815
1.12
1.87e-05
0.179
4040
3.75
44
Female
Western Germany
0
6
AfD
4.58
-0.826
0.00832
1.12
0.000327
-0.739
4041
6
37
Male
Eastern Germany
1
6
Other party
2.81
3.19
0.0136
1.12
0.00806
2.86
4042
1.5
21
Female
Western Germany
1
6
Gruene
1.47
0.031
0.00508
1.12
2.78e-07
0.0276
4044
2.25
26
Female
Western Germany
1
5
Gruene
1.35
0.897
0.00429
1.12
0.000197
0.8
4045
2.5
24
Male
Eastern Germany
0
7
FDP
3.11
-0.609
0.00709
1.12
0.000151
-0.544
4046
1.5
36
Female
Western Germany
0
4
SPD
2.1
-0.596
0.00527
1.12
0.000107
-0.532
4048
1.25
45
Male
Eastern Germany
1
7
Gruene
2.22
-0.973
0.00481
1.12
0.00026
-0.868
4049
3.25
62
Female
Western Germany
0
7
SPD
3.15
0.0982
0.00418
1.12
2.3e-06
0.0876
4051
3.75
42
Male
Western Germany
0
5
FDP
2.97
0.781
0.00465
1.12
0.000162
0.697
4055
2
23
Female
Western Germany
0
5
Gruene
1.66
0.34
0.00368
1.12
2.43e-05
0.304
4057
2.5
69
Female
Western Germany
1
7
CDU-CSU
3.22
-0.724
0.00451
1.12
0.000135
-0.646
4059
2.5
52
Female
Western Germany
0
5
FDP
3.05
-0.549
0.00489
1.12
8.42e-05
-0.49
4062
2
34
Male
Western Germany
0
4
CDU-CSU
2.46
-0.464
0.00426
1.12
5.24e-05
-0.414
4064
2.75
57
Female
Eastern Germany
0
8
SPD
3.31
-0.563
0.00519
1.12
9.42e-05
-0.503
4066
5
55
Female
Eastern Germany
0
7
Linke
2.81
2.19
0.00745
1.12
0.00205
1.95
4068
7
70
Female
Eastern Germany
1
6
AfD
4.71
2.29
0.0113
1.12
0.00342
2.05
4072
1.5
84
Female
Western Germany
1
7
Gruene
2.76
-1.26
0.00605
1.12
0.000548
-1.12
4075
1.5
42
Male
Western Germany
0
6
Gruene
2.28
-0.782
0.00326
1.12
0.000114
-0.697
4078
1.5
55
Female
Western Germany
0
5
SPD
2.63
-1.13
0.00408
1.12
0.000296
-1
4079
2.25
52
Male
Western Germany
0
4
FDP
2.94
-0.689
0.00556
1.12
0.000151
-0.615
4083
2
46
Male
Western Germany
1
5
FDP
2.68
-0.68
0.00549
1.12
0.000145
-0.607
4084
2.25
29
Female
Western Germany
0
7
Would not vote
3.32
-1.07
0.0115
1.12
0.000772
-0.962
4085
2.75
41
Male
Western Germany
0
6
Gruene
2.26
0.485
0.00328
1.12
4.4e-05
0.433
4088
2.25
38
Male
Western Germany
1
4
Gruene
1.45
0.8
0.00405
1.12
0.000148
0.714
4090
2.5
55
Male
Western Germany
0
4
Gruene
2.1
0.399
0.00415
1.12
3.77e-05
0.356
4096
1
38
Male
Eastern Germany
0
8
AfD
5.02
-4.02
0.00872
1.12
0.0081
-3.59
4098
2.25
36
Female
Western Germany
0
5
Linke
2.03
0.216
0.00811
1.12
2.17e-05
0.193
4100
3
27
Female
Western Germany
0
5
FDP
2.62
0.382
0.00546
1.12
4.55e-05
0.341
4102
3
29
Female
Eastern Germany
0
6
FDP
2.9
0.0997
0.00661
1.12
3.77e-06
0.089
4104
2.25
57
Male
Western Germany
1
7
Gruene
2.38
-0.135
0.00444
1.12
4.6e-06
-0.12
4105
3
77
Male
Eastern Germany
0
8
SPD
3.75
-0.751
0.0055
1.12
0.000177
-0.67
4106
1.75
70
Male
Eastern Germany
0
6
Gruene
2.81
-1.06
0.00512
1.12
0.000329
-0.946
4107
2
64
Male
Western Germany
1
8
CDU-CSU
3.43
-1.43
0.00553
1.12
0.00065
-1.28
4108
3.5
38
Female
Western Germany
1
8
SPD
2.58
0.918
0.0081
1.12
0.000393
0.821
4109
1.25
55
Female
Western Germany
0
6
Gruene
2.41
-1.16
0.00298
1.12
0.00023
-1.04
4110
3
65
Female
Eastern Germany
1
7
CDU-CSU
3.2
-0.2
0.00498
1.12
1.14e-05
-0.179
4118
2.25
64
Female
Western Germany
0
6
Gruene
2.57
-0.319
0.00338
1.12
1.96e-05
-0.284
4119
2.25
55
Female
Eastern Germany
0
4
SPD
2.47
-0.219
0.00756
1.12
2.08e-05
-0.196
4122
1.75
56
Female
Western Germany
1
7
CDU-CSU
3
-1.25
0.0045
1.12
0.000402
-1.12
4130
2.75
36
Female
Western Germany
1
5
FDP
2.41
0.335
0.00625
1.12
4.03e-05
0.299
4135
1.75
34
Male
Western Germany
0
4
Linke
1.89
-0.14
0.00879
1.12
9.89e-06
-0.125
4137
1.5
66
Female
Western Germany
0
6
Gruene
2.6
-1.1
0.00351
1.12
0.000243
-0.984
4138
6.25
64
Female
Eastern Germany
1
7
FDP
3.35
2.9
0.007
1.12
0.00339
2.59
4139
3.75
24
Male
Eastern Germany
0
6
FDP
2.91
0.844
0.00675
1.12
0.000276
0.753
4140
4.25
65
Female
Western Germany
0
6
SPD
3
1.25
0.00393
1.12
0.00035
1.11
4141
3.25
66
Female
Western Germany
0
7
Would not vote
3.96
-0.713
0.0104
1.12
0.000306
-0.638
4142
2.5
78
Female
Eastern Germany
0
6
Gruene
2.86
-0.356
0.00583
1.12
4.22e-05
-0.318
4146
2.5
56
Male
Western Germany
0
4
Linke
2.27
0.231
0.00896
1.12
2.75e-05
0.206
4154
6
57
Male
Western Germany
0
7
CDU-CSU
3.47
2.53
0.00333
1.12
0.00122
2.26
4156
2
19
Female
Eastern Germany
0
7
Linke
2.19
-0.192
0.0098
1.12
2.07e-05
-0.171
4158
2.25
57
Male
Western Germany
0
6
Gruene
2.54
-0.291
0.00336
1.12
1.62e-05
-0.259
4163
3
59
Female
Western Germany
0
6
CDU-CSU
3.21
-0.208
0.00272
1.12
6.67e-06
-0.185
4168
4
50
Female
Eastern Germany
0
8
SPD
3.19
0.807
0.00547
1.12
0.000204
0.721
4170
3.25
69
Male
Western Germany
1
6
SPD
2.8
0.446
0.00511
1.12
5.82e-05
0.398
4173
1.5
47
Male
Eastern Germany
0
7
Gruene
2.62
-1.12
0.00431
1.12
0.000306
-0.996
4180
1.5
61
Female
Western Germany
1
7
Other party
3.29
-1.79
0.0143
1.12
0.00267
-1.61
4181
3.5
70
Male
Western Germany
0
6
Gruene
2.76
0.735
0.00411
1.12
0.000127
0.656
4190
2
63
Female
Western Germany
1
6
Gruene
2.19
-0.193
0.004
1.12
8.52e-06
-0.172
4198
3.5
54
Male
Western Germany
0
5
AfD
4.64
-1.14
0.00788
1.12
0.000587
-1.02
4199
3
28
Female
Western Germany
0
8
Other party
3.28
-0.283
0.0147
1.12
6.84e-05
-0.253
4203
1
24
Female
Western Germany
1
6
Gruene
1.52
-0.521
0.00479
1.12
7.42e-05
-0.465
4204
3
64
Female
Western Germany
0
6
CDU-CSU
3.29
-0.294
0.00281
1.12
1.38e-05
-0.262
4206
1.5
41
Female
Western Germany
1
4
Gruene
1.41
0.0911
0.00428
1.12
2.03e-06
0.0812
4209
3.5
63
Female
Eastern Germany
1
6
Gruene
2.24
1.26
0.00516
1.12
0.00047
1.13
4212
2.75
49
Female
Eastern Germany
0
6
Would not vote
3.51
-0.763
0.0105
1.12
0.000355
-0.682
4213
1.5
65
Female
Eastern Germany
1
8
FDP
3.57
-2.07
0.00742
1.12
0.00182
-1.85
4214
3.25
61
Female
Western Germany
0
5
CDU-CSU
3.04
0.21
0.00316
1.12
7.96e-06
0.188
4215
4.75
80
Male
Eastern Germany
0
8
CDU-CSU
4.11
0.638
0.00456
1.12
0.000106
0.569
4217
2
43
Male
Western Germany
0
5
Gruene
2.1
-0.0968
0.00313
1.12
1.67e-06
-0.0863
4218
3.5
42
Female
Western Germany
0
4
Would not vote
2.94
0.558
0.011
1.12
0.000198
0.5
4219
1.25
49
Male
Eastern Germany
1
4
Gruene
1.68
-0.435
0.00637
1.12
6.9e-05
-0.388
4221
1.25
63
Female
Western Germany
0
5
SPD
2.76
-1.51
0.00428
1.12
0.00056
-1.35
4222
6.25
62
Female
Western Germany
0
7
SPD
3.15
3.1
0.00418
1.12
0.00229
2.76
4223
1
61
Female
Western Germany
0
4
SPD
2.53
-1.53
0.0053
1.12
0.000707
-1.36
4224
6.25
42
Male
Western Germany
0
5
AfD
4.43
1.82
0.0078
1.12
0.00148
1.62
4227
2
30
Male
Western Germany
0
6
Gruene
2.08
-0.0751
0.00377
1.12
1.21e-06
-0.067
4231
2.25
62
Male
Western Germany
0
5
Would not vote
3.58
-1.33
0.0104
1.12
0.00107
-1.19
4232
4.25
71
Male
Western Germany
1
8
AfD
5.18
-0.931
0.0112
1.12
0.00056
-0.833
4238
2
75
Male
Western Germany
0
5
FDP
3.54
-1.54
0.00617
1.12
0.000836
-1.37
4243
7
93
Male
Eastern Germany
0
8
AfD
5.96
1.04
0.0101
1.12
0.000628
0.927
4244
1.25
22
Male
Western Germany
0
5
FDP
2.62
-1.37
0.00567
1.12
0.000613
-1.23
4247
2
39
Female
Western Germany
1
6
CDU-CSU
2.5
-0.504
0.00471
1.12
6.84e-05
-0.45
4249
5.75
39
Female
Eastern Germany
0
5
Would not vote
3.14
2.61
0.0116
1.12
0.00457
2.34
4250
2.75
60
Female
Western Germany
1
6
Gruene
2.14
0.608
0.00386
1.12
8.16e-05
0.543
4251
3
82
Female
Eastern Germany
0
8
CDU-CSU
4.05
-1.05
0.00455
1.12
0.000289
-0.941
4253
2
79
Male
Western Germany
0
7
SPD
3.54
-1.54
0.00502
1.12
0.000678
-1.37
4255
3
33
Female
Western Germany
0
5
Would not vote
2.99
0.011
0.0104
1.12
7.35e-08
0.00988
4260
2.5
63
Male
Eastern Germany
0
7
CDU-CSU
3.62
-1.12
0.00368
1.12
0.000262
-0.996
4261
2.5
73
Male
Eastern Germany
0
8
FDP
4.16
-1.66
0.00642
1.12
0.00101
-1.48
4263
1
62
Male
Eastern Germany
0
6
CDU-CSU
3.4
-2.4
0.00391
1.12
0.00128
-2.14
4264
1.75
34
Female
Western Germany
1
8
CDU-CSU
2.82
-1.07
0.0074
1.12
0.00049
-0.959
4265
3
39
Male
Western Germany
0
5
Would not vote
3.18
-0.185
0.0102
1.12
2.01e-05
-0.165
4266
1.25
27
Female
Western Germany
0
5
Gruene
1.73
-0.479
0.00341
1.12
4.45e-05
-0.427
4268
2
22
Male
Western Germany
0
5
Gruene
1.73
0.265
0.00398
1.12
1.6e-05
0.237
4272
1.75
47
Female
Western Germany
0
5
CDU-CSU
2.8
-1.05
0.00308
1.12
0.000193
-0.935
4274
3
21
Male
Western Germany
0
7
Gruene
2.12
0.878
0.00567
1.12
0.00025
0.783
4275
5.75
67
Male
Western Germany
0
8
SPD
3.53
2.22
0.00558
1.12
0.00157
1.98
4276
2
62
Male
Western Germany
1
4
CDU-CSU
2.59
-0.588
0.00502
1.12
9.93e-05
-0.525
4278
2.5
70
Male
Western Germany
0
7
CDU-CSU
3.69
-1.19
0.00345
1.12
0.00028
-1.06
4279
4
52
Female
Eastern Germany
1
8
CDU-CSU
3.18
0.821
0.00574
1.12
0.000222
0.733
4285
1.75
62
Female
Western Germany
1
5
Gruene
1.97
-0.224
0.00418
1.12
1.19e-05
-0.199
4286
2.5
47
Male
Western Germany
1
6
CDU-CSU
2.73
-0.235
0.00407
1.12
1.28e-05
-0.209
4289
2.25
64
Female
Western Germany
0
6
CDU-CSU
3.29
-1.04
0.00281
1.12
0.000174
-0.93
4291
1.75
53
Male
Western Germany
0
6
Gruene
2.47
-0.722
0.00325
1.12
9.65e-05
-0.643
4293
2
64
Female
Western Germany
0
8
CDU-CSU
3.7
-1.7
0.00404
1.12
0.000666
-1.52
4295
2
32
Male
Western Germany
0
4
SPD
2.12
-0.119
0.00536
1.12
4.37e-06
-0.107
4298
4.75
71
Female
Eastern Germany
1
8
Linke
2.93
1.82
0.00926
1.12
0.00177
1.63
4299
4.25
72
Female
Eastern Germany
1
8
SPD
3.21
1.04
0.00652
1.12
0.000402
0.926
4300
4
59
Female
Western Germany
0
7
Gruene
2.69
1.31
0.00358
1.12
0.000353
1.17
4301
1.5
66
Female
Western Germany
1
7
SPD
2.86
-1.36
0.00558
1.12
0.000593
-1.22
4302
4
70
Female
Eastern Germany
0
8
Linke
3.27
0.727
0.00821
1.12
0.00025
0.649
4304
2.5
53
Female
Eastern Germany
0
8
Gruene
2.83
-0.33
0.00467
1.12
2.9e-05
-0.294
4308
4
75
Female
Western Germany
0
6
FDP
3.65
0.352
0.00576
1.12
4.09e-05
0.314
4314
1.75
66
Male
Eastern Germany
0
8
FDP
4.04
-2.29
0.00613
1.12
0.00183
-2.04
4319
7
68
Male
Western Germany
0
8
Other party
4.06
2.94
0.0141
1.12
0.0071
2.63
4320
4.5
54
Female
Eastern Germany
0
5
Other party
3.17
1.33
0.0141
1.12
0.00145
1.19
4321
1.75
59
Male
Eastern Germany
0
5
CDU-CSU
3.14
-1.39
0.00478
1.12
0.000529
-1.24
4323
2.5
52
Female
Western Germany
1
8
CDU-CSU
3.13
-0.633
0.00586
1.12
0.000135
-0.565
4326
1.5
59
Female
Eastern Germany
1
8
SPD
2.99
-1.49
0.00655
1.12
0.000832
-1.33
4327
2.75
54
Male
Western Germany
0
7
CDU-CSU
3.42
-0.666
0.00339
1.12
8.58e-05
-0.594
4329
2.5
71
Male
Western Germany
0
6
Would not vote
3.94
-1.44
0.0106
1.12
0.00127
-1.29
4330
3
77
Male
Western Germany
0
8
CDU-CSU
4.02
-1.02
0.00468
1.12
0.000275
-0.906
4336
2.5
41
Male
Western Germany
0
4
CDU-CSU
2.58
-0.0847
0.00398
1.12
1.63e-06
-0.0755
4340
4.5
65
Female
Eastern Germany
0
6
Linke
2.78
1.72
0.00793
1.12
0.00135
1.54
4342
1.25
58
Female
Western Germany
0
5
Gruene
2.26
-1.01
0.00332
1.12
0.000194
-0.903
4345
2.75
63
Female
Eastern Germany
1
6
FDP
3.13
-0.378
0.00727
1.12
5.97e-05
-0.338
4347
3.25
48
Male
Eastern Germany
0
6
CDU-CSU
3.16
0.0943
0.00399
1.12
2.03e-06
0.0841
4349
1.75
33
Female
Western Germany
0
5
Gruene
1.83
-0.082
0.00312
1.12
1.19e-06
-0.0731
4351
5.5
46
Male
Western Germany
0
5
AfD
4.5
0.999
0.00777
1.12
0.000446
0.893
4358
1.75
64
Male
Western Germany
0
5
SPD
2.87
-1.12
0.00431
1.12
0.00031
-1
4359
1.5
66
Female
Western Germany
1
7
Gruene
2.45
-0.947
0.0046
1.12
0.000236
-0.845
4363
4
39
Male
Western Germany
0
6
AfD
4.58
-0.583
0.0078
1.12
0.000152
-0.521
4366
2.5
39
Female
Western Germany
0
4
FDP
2.62
-0.122
0.00569
1.12
4.89e-06
-0.109
4369
1.75
39
Male
Western Germany
0
7
Gruene
2.43
-0.683
0.00423
1.12
0.000113
-0.609
4370
5.25
31
Male
Western Germany
0
8
Other party
3.43
1.82
0.0145
1.12
0.00281
1.63
4372
2.25
69
Female
Western Germany
0
7
SPD
3.27
-1.02
0.00431
1.12
0.000257
-0.912
4375
1.25
49
Female
Eastern Germany
0
7
CDU-CSU
3.28
-2.03
0.00389
1.12
0.000918
-1.81
4376
1
52
Male
Eastern Germany
1
4
SPD
2.15
-1.15
0.00793
1.12
0.000604
-1.03
4377
2
46
Male
Eastern Germany
1
6
Other party
2.97
-0.967
0.0135
1.12
0.000735
-0.867
4379
6.25
71
Male
Eastern Germany
0
8
AfD
5.58
0.665
0.00823
1.12
0.00021
0.595
4383
1.75
19
Female
Western Germany
0
5
FDP
2.48
-0.73
0.00612
1.12
0.000187
-0.652
4389
2.5
47
Male
Western Germany
0
6
Gruene
2.37
0.132
0.0032
1.12
3.17e-06
0.117
4392
2
64
Male
Western Germany
1
7
Other party
3.43
-1.43
0.014
1.12
0.00168
-1.29
4393
4.5
83
Male
Eastern Germany
1
8
CDU-CSU
3.81
0.694
0.00568
1.12
0.000157
0.62
4401
3.5
57
Female
Western Germany
0
6
Gruene
2.45
1.05
0.00304
1.12
0.000192
0.938
4405
3.25
63
Male
Western Germany
0
6
CDU-CSU
3.37
-0.119
0.00291
1.12
2.35e-06
-0.106
4412
2
54
Male
Western Germany
0
5
SPD
2.7
-0.701
0.00407
1.12
0.000114
-0.625
4413
4.25
36
Male
Western Germany
0
7
SPD
2.8
1.45
0.00554
1.12
0.00067
1.3
4415
1.5
60
Female
Western Germany
0
4
FDP
2.98
-1.48
0.00631
1.12
0.000797
-1.33
4416
3
20
Male
Eastern Germany
0
5
Would not vote
2.9
0.0975
0.0126
1.12
6.93e-06
0.0873
4418
5.5
70
Male
Eastern Germany
0
8
CDU-CSU
3.94
1.56
0.00419
1.12
0.000582
1.39
4419
4.5
22
Male
Western Germany
0
7
AfD
4.49
0.00811
0.00995
1.12
3.78e-08
0.00726
4420
1.25
30
Male
Western Germany
1
4
Gruene
1.31
-0.0617
0.00425
1.12
9.22e-07
-0.055
4421
2.25
36
Female
Eastern Germany
0
7
FDP
3.22
-0.973
0.0062
1.12
0.000337
-0.869
4428
2.5
64
Male
Western Germany
1
5
Gruene
2.1
0.4
0.00416
1.12
3.79e-05
0.356
4431
5
82
Male
Western Germany
1
6
CDU-CSU
3.34
1.66
0.00486
1.12
0.000766
1.48
4433
4.25
80
Female
Western Germany
0
6
Gruene
2.84
1.41
0.00482
1.12
0.000544
1.25
4434
1.75
40
Female
Western Germany
1
4
Gruene
1.39
0.358
0.00428
1.12
3.14e-05
0.32
4435
2
60
Male
Western Germany
0
5
CDU-CSU
3.11
-1.11
0.00313
1.12
0.000221
-0.994
4436
4
69
Male
Western Germany
0
5
SPD
2.96
1.04
0.00456
1.12
0.000282
0.928
4438
2.25
81
Male
Western Germany
1
6
FDP
3.49
-1.24
0.00703
1.12
0.000616
-1.1
4439
1.5
41
Male
Eastern Germany
0
5
Gruene
2.11
-0.608
0.00478
1.12
0.000101
-0.542
4443
2.5
55
Male
Eastern Germany
1
4
Linke
1.94
0.561
0.0102
1.12
0.000186
0.502
4446
2.5
40
Male
Eastern Germany
1
5
Gruene
1.73
0.768
0.00512
1.12
0.000173
0.685
4449
2.5
52
Female
Western Germany
0
7
Gruene
2.56
-0.0646
0.00348
1.12
8.26e-07
-0.0576
4452
3.75
37
Female
Western Germany
0
6
Other party
3.03
0.717
0.0121
1.12
0.000362
0.642
4457
1.75
56
Male
Western Germany
1
4
Gruene
1.76
-0.00996
0.00445
1.12
2.52e-08
-0.00889
4459
5.5
76
Female
Western Germany
1
7
CDU-CSU
3.34
2.16
0.00478
1.12
0.00127
1.92
4460
3.75
61
Female
Western Germany
0
4
FDP
3
0.748
0.00638
1.12
0.000205
0.668
4461
2
20
Male
Eastern Germany
0
7
Linke
2.3
-0.301
0.00982
1.12
5.14e-05
-0.269
4462
2
45
Female
Eastern Germany
0
6
CDU-CSU
3.01
-1.01
0.0042
1.12
0.000245
-0.902
4467
4
54
Male
Western Germany
0
5
CDU-CSU
3.01
0.989
0.00303
1.12
0.000169
0.881
4468
4.75
26
Male
Western Germany
0
6
AfD
4.36
0.392
0.00865
1.12
7.64e-05
0.35
4473
2.25
48
Female
Western Germany
0
5
CDU-CSU
2.82
-0.565
0.00306
1.12
5.57e-05
-0.504
4474
2.75
34
Female
Eastern Germany
0
8
FDP
3.39
-0.641
0.00711
1.12
0.000168
-0.573
4475
4.75
48
Male
Western Germany
0
6
FDP
3.27
1.48
0.00454
1.12
0.000564
1.32
4477
3.5
87
Male
Eastern Germany
1
8
CDU-CSU
3.87
-0.375
0.00595
1.12
4.78e-05
-0.334
4478
2.75
83
Female
Western Germany
1
5
CDU-CSU
3.06
-0.31
0.00584
1.12
3.22e-05
-0.277
4481
4.75
57
Male
Western Germany
0
5
Would not vote
3.5
1.25
0.0102
1.12
0.000929
1.12
4482
1.75
49
Female
Western Germany
0
5
Gruene
2.11
-0.358
0.00298
1.12
2.18e-05
-0.319
4483
2.75
50
Male
Eastern Germany
0
6
SPD
2.88
-0.13
0.00494
1.12
4.78e-06
-0.116
4485
4.25
30
Female
Western Germany
0
7
CDU-CSU
2.91
1.34
0.00478
1.12
0.00049
1.2
4492
4.5
42
Male
Western Germany
0
5
AfD
4.43
0.0682
0.0078
1.12
2.09e-06
0.061
4493
1
86
Male
Western Germany
0
6
SPD
3.46
-2.46
0.00549
1.12
0.00189
-2.19
4498
5
57
Female
Western Germany
1
5
FDP
2.78
2.22
0.00619
1.12
0.00175
1.99
4499
4.75
42
Female
Eastern Germany
0
7
AfD
4.79
-0.0397
0.00857
1.12
7.77e-07
-0.0355
4501
4
45
Female
Western Germany
0
4
FDP
2.73
1.27
0.0057
1.12
0.00053
1.14
4502
1.25
54
Male
Western Germany
1
5
CDU-CSU
2.65
-1.4
0.00397
1.12
0.000446
-1.25
4504
3.75
70
Female
Western Germany
0
8
FDP
3.97
-0.217
0.0064
1.12
1.73e-05
-0.194
4507
2
24
Male
Western Germany
0
5
Other party
2.7
-0.699
0.0124
1.12
0.000351
-0.626
4508
4.5
83
Male
Western Germany
0
8
CDU-CSU
4.12
0.381
0.005
1.12
4.16e-05
0.34
4509
3.25
30
Female
Eastern Germany
0
6
AfD
4.38
-1.13
0.00936
1.12
0.00069
-1.01
4510
7
82
Male
Eastern Germany
0
8
AfD
5.77
1.23
0.00896
1.12
0.000775
1.1
4511
4.75
54
Male
Eastern Germany
0
6
AfD
4.89
-0.136
0.00773
1.12
8.28e-06
-0.122
4518
4
71
Male
Eastern Germany
0
8
CDU-CSU
3.96
0.0428
0.00421
1.12
4.4e-07
0.0382
4520
2.5
67
Male
Western Germany
1
6
FDP
3.24
-0.744
0.00589
1.12
0.000187
-0.664
4524
2
46
Female
Western Germany
0
5
FDP
2.95
-0.946
0.00482
1.12
0.000246
-0.844
4530
2.75
56
Male
Western Germany
0
4
Other party
3.05
-0.298
0.0134
1.12
6.91e-05
-0.267
4533
6
59
Female
Western Germany
0
7
Would not vote
3.84
2.16
0.0103
1.12
0.00276
1.93
4536
2.25
25
Male
Western Germany
0
4
SPD
2
0.251
0.00587
1.12
2.12e-05
0.224
4537
2.5
83
Male
Western Germany
0
7
CDU-CSU
3.92
-1.42
0.00419
1.12
0.00048
-1.26
4538
1.5
38
Male
Western Germany
0
4
Gruene
1.81
-0.308
0.00371
1.12
2.01e-05
-0.275
4540
4
23
Male
Western Germany
0
6
FDP
2.84
1.16
0.00588
1.12
0.00045
1.03
4541
3
19
Female
Western Germany
0
5
Gruene
1.59
1.41
0.004
1.12
0.000454
1.26
4542
3.75
54
Male
Western Germany
0
5
CDU-CSU
3.01
0.739
0.00303
1.12
9.42e-05
0.658
4543
1
25
Female
Western Germany
1
5
Gruene
1.34
-0.336
0.00436
1.12
2.8e-05
-0.299
4545
2
36
Male
Western Germany
0
4
SPD
2.19
-0.188
0.00515
1.12
1.05e-05
-0.168
4547
3.25
44
Male
Western Germany
0
6
Would not vote
3.47
-0.223
0.01
1.12
2.9e-05
-0.2
4548
2.5
53
Female
Western Germany
0
7
Gruene
2.58
-0.0818
0.00348
1.12
1.33e-06
-0.0729
4552
7
30
Male
Eastern Germany
0
8
Would not vote
3.68
3.32
0.0125
1.12
0.00796
2.97
4554
2.5
58
Female
Western Germany
0
5
Gruene
2.26
0.237
0.00332
1.12
1.06e-05
0.211
4555
4
65
Female
Western Germany
0
5
AfD
4.74
-0.736
0.00925
1.12
0.000289
-0.658
4557
2
37
Female
Eastern Germany
1
4
Gruene
1.39
0.615
0.00675
1.12
0.000146
0.549
4558
3
49
Female
Western Germany
1
5
FDP
2.64
0.361
0.00602
1.12
4.5e-05
0.322
4560
2.25
72
Male
Western Germany
1
7
CDU-CSU
3.37
-1.12
0.00451
1.12
0.000322
-0.998
4561
2.5
71
Female
Western Germany
0
7
FDP
3.78
-1.28
0.00558
1.12
0.000524
-1.14
4563
2.5
20
Female
Western Germany
0
4
FDP
2.29
0.205
0.00653
1.12
1.58e-05
0.183
4572
3.75
59
Male
Western Germany
1
6
FDP
3.11
0.644
0.00555
1.12
0.000132
0.575
4573
3.25
27
Female
Western Germany
1
6
CDU-CSU
2.3
0.953
0.00581
1.12
0.000302
0.85
4576
2.25
62
Male
Western Germany
1
6
CDU-CSU
2.99
-0.743
0.00386
1.12
0.000122
-0.663
4578
2.5
38
Male
Western Germany
1
4
SPD
1.86
0.636
0.00601
1.12
0.000139
0.567
4581
7
48
Female
Western Germany
1
7
Gruene
2.14
4.86
0.00435
1.12
0.00587
4.34
4584
3.5
78
Female
Eastern Germany
0
8
CDU-CSU
3.99
-0.486
0.00432
1.12
5.82e-05
-0.433
4588
2.5
22
Male
Western Germany
1
6
Gruene
1.58
0.921
0.00499
1.12
0.000242
0.822
4591
3
47
Female
Western Germany
1
5
Gruene
1.71
1.29
0.00364
1.12
0.000343
1.15
4594
1.75
80
Male
Western Germany
0
6
CDU-CSU
3.66
-1.91
0.00382
1.12
0.000797
-1.71
4595
2.25
36
Male
Western Germany
0
5
Linke
2.13
0.123
0.00822
1.12
7.19e-06
0.11
4597
3.5
63
Female
Western Germany
0
7
CDU-CSU
3.48
0.0209
0.00306
1.12
7.6e-08
0.0186
4599
3.25
68
Female
Western Germany
0
6
FDP
3.53
-0.277
0.00521
1.12
2.29e-05
-0.248
4606
2.25
74
Male
Western Germany
0
7
FDP
3.93
-1.68
0.00581
1.12
0.000935
-1.5
4608
7
51
Male
Western Germany
0
5
SPD
2.65
4.35
0.00407
1.12
0.00439
3.88
4609
4
76
Male
Eastern Germany
0
8
AfD
5.67
-1.67
0.00851
1.12
0.00137
-1.49
4610
4.75
69
Female
Western Germany
0
7
AfD
5.21
-0.46
0.00897
1.12
0.000109
-0.411
4613
3.5
69
Female
Western Germany
0
6
CDU-CSU
3.38
0.12
0.00299
1.12
2.45e-06
0.107
4614
4.25
54
Male
Western Germany
0
8
FDP
3.78
0.467
0.00635
1.12
7.92e-05
0.417
4618
2.75
53
Male
Western Germany
1
6
Gruene
2.11
0.637
0.00366
1.12
8.46e-05
0.568
4620
1.75
37
Male
Western Germany
0
7
CDU-CSU
3.12
-1.37
0.00435
1.12
0.000469
-1.22
4621
1.5
51
Female
Eastern Germany
1
6
Gruene
2.03
-0.532
0.0048
1.12
7.76e-05
-0.474
4625
4
68
Female
Eastern Germany
0
6
FDP
3.57
0.427
0.00645
1.12
6.75e-05
0.382
4634
1
43
Male
Western Germany
1
6
CDU-CSU
2.67
-1.67
0.00427
1.12
0.000676
-1.49
4635
2.5
74
Male
Western Germany
0
4
SPD
2.84
-0.344
0.00607
1.12
4.11e-05
-0.307
4636
3.5
45
Male
Western Germany
0
8
Would not vote
3.9
-0.396
0.0121
1.12
0.000109
-0.354
4638
2.5
43
Female
Western Germany
0
4
CDU-CSU
2.53
-0.0268
0.00404
1.12
1.66e-07
-0.0239
4639
1.25
54
Male
Western Germany
1
6
Gruene
2.13
-0.88
0.00368
1.12
0.000162
-0.785
4640
3.75
71
Female
Western Germany
0
6
CDU-CSU
3.41
0.335
0.00309
1.12
1.98e-05
0.299
4641
4
35
Female
Western Germany
0
6
Would not vote
3.23
0.774
0.0103
1.12
0.000357
0.693
4645
1
57
Female
Western Germany
0
4
Linke
2.19
-1.19
0.00904
1.12
0.000743
-1.07
4646
5
68
Male
Eastern Germany
0
8
CDU-CSU
3.91
1.09
0.00416
1.12
0.000284
0.976
4648
2
63
Male
Western Germany
1
6
CDU-CSU
3.01
-1.01
0.00387
1.12
0.000226
-0.901
4649
3
56
Male
Eastern Germany
1
6
SPD
2.63
0.375
0.00579
1.12
4.66e-05
0.335
4651
2.5
59
Female
Eastern Germany
0
7
Gruene
2.73
-0.231
0.00416
1.12
1.26e-05
-0.206
4654
5
74
Male
Western Germany
1
6
CDU-CSU
3.2
1.8
0.00428
1.12
0.000791
1.61
4656
3
35
Female
Eastern Germany
0
7
FDP
3.21
-0.206
0.00627
1.12
1.53e-05
-0.184
4657
2.75
56
Female
Eastern Germany
0
4
Gruene
2.07
0.679
0.00667
1.12
0.000176
0.606
4668
4.25
79
Female
Eastern Germany
0
8
CDU-CSU
4
0.247
0.00437
1.12
1.53e-05
0.221
4669
3.75
43
Male
Eastern Germany
0
7
AfD
4.9
-1.15
0.00774
1.12
0.000587
-1.03
4671
2.5
32
Female
Western Germany
0
6
Linke
2.17
0.332
0.00843
1.12
5.35e-05
0.297
4673
6
71
Male
Western Germany
0
8
CDU-CSU
3.91
2.09
0.00448
1.12
0.00112
1.86
4674
1.25
19
Male
Western Germany
0
4
SPD
1.9
-0.645
0.00645
1.12
0.000154
-0.576
4676
5
59
Male
Eastern Germany
0
5
CDU-CSU
3.14
1.86
0.00478
1.12
0.000941
1.66
4678
2.25
60
Male
Western Germany
1
6
Gruene
2.23
0.0161
0.00385
1.12
5.69e-08
0.0144
4683
4.25
81
Male
Western Germany
1
5
SPD
2.81
1.44
0.00633
1.12
0.000754
1.29
4685
2.25
22
Male
Western Germany
1
6
Gruene
1.58
0.671
0.00499
1.12
0.000129
0.599
4688
2.25
43
Male
Western Germany
0
4
AfD
4.25
-2
0.00864
1.12
0.00198
-1.78
4690
2
51
Male
Western Germany
1
4
CDU-CSU
2.4
-0.399
0.00476
1.12
4.32e-05
-0.356
4691
1.5
56
Female
Eastern Germany
0
8
CDU-CSU
3.61
-2.11
0.00413
1.12
0.00105
-1.88
4692
3.25
35
Female
Western Germany
0
5
Other party
2.8
0.454
0.0123
1.12
0.000147
0.407
4693
4.75
88
Male
Western Germany
0
7
CDU-CSU
4
0.747
0.00464
1.12
0.000148
0.667
4695
2.25
50
Female
Eastern Germany
0
8
Gruene
2.78
-0.528
0.00472
1.12
7.51e-05
-0.471
4696
2.25
89
Female
Western Germany
1
6
CDU-CSU
3.37
-1.12
0.00578
1.12
0.000413
-0.997
4701
2.5
70
Female
Eastern Germany
1
8
FDP
3.65
-1.15
0.00757
1.12
0.000579
-1.03
4702
3.5
83
Female
Western Germany
1
8
CDU-CSU
3.67
-0.168
0.00598
1.12
9.66e-06
-0.15
4703
2.75
68
Female
Eastern Germany
0
8
SPD
3.5
-0.753
0.00511
1.12
0.000166
-0.672
4708
4.25
58
Male
Western Germany
1
5
Gruene
2
2.25
0.00381
1.12
0.0011
2.01
4709
4.5
68
Female
Western Germany
1
5
Gruene
2.08
2.42
0.00462
1.12
0.00155
2.16
4710
6
55
Male
Western Germany
0
5
FDP
3.19
2.81
0.00477
1.12
0.00215
2.5
4721
3.25
57
Male
Western Germany
0
4
Other party
3.07
0.185
0.0135
1.12
2.68e-05
0.166
4722
3.5
57
Male
Western Germany
0
5
FDP
3.23
0.272
0.00485
1.12
2.05e-05
0.243
4728
1.25
22
Male
Eastern Germany
0
7
Gruene
2.18
-0.935
0.00588
1.12
0.000294
-0.835
4729
2.25
40
Male
Western Germany
0
5
CDU-CSU
2.77
-0.52
0.00333
1.12
5.12e-05
-0.464
4730
3.5
26
Female
Western Germany
0
4
CDU-CSU
2.23
1.27
0.0049
1.12
0.000449
1.13
4732
2
26
Female
Western Germany
0
4
Other party
2.44
-0.438
0.0132
1.12
0.000148
-0.393
4734
5.75
82
Male
Eastern Germany
0
8
Would not vote
4.58
1.17
0.0117
1.12
0.000933
1.05
4738
2.5
58
Female
Eastern Germany
0
8
Would not vote
4.07
-1.57
0.0107
1.12
0.00153
-1.41
4740
4
64
Female
Eastern Germany
0
8
CDU-CSU
3.74
0.256
0.004
1.12
1.49e-05
0.228
4744
4.75
82
Male
Eastern Germany
0
8
SPD
3.84
0.913
0.00577
1.12
0.000275
0.815
4748
2.25
58
Male
Western Germany
0
4
Gruene
2.15
0.097
0.00434
1.12
2.33e-06
0.0866
4749
1.75
58
Male
Western Germany
1
4
Gruene
1.79
-0.0445
0.00456
1.12
5.15e-07
-0.0397
4751
2.5
54
Female
Eastern Germany
1
7
CDU-CSU
3.01
-0.511
0.00509
1.12
7.58e-05
-0.456
4753
2
65
Male
Western Germany
0
4
Gruene
2.27
-0.274
0.00491
1.12
2.1e-05
-0.244
4754
1
46
Male
Western Germany
0
5
Linke
2.3
-1.3
0.008
1.12
0.000777
-1.16
4755
1.5
49
Female
Western Germany
1
4
Gruene
1.55
-0.0469
0.00441
1.12
5.53e-07
-0.0418
4757
2.25
47
Female
Western Germany
0
5
SPD
2.49
-0.238
0.00412
1.12
1.33e-05
-0.212
4759
2.25
38
Male
Western Germany
1
6
Other party
2.78
-0.534
0.0131
1.12
0.000217
-0.478
4761
1.25
63
Female
Western Germany
1
6
SPD
2.61
-1.36
0.00517
1.12
0.000545
-1.21
4762
5.5
96
Male
Eastern Germany
0
8
SPD
4.08
1.42
0.00702
1.12
0.000814
1.27
4765
2
27
Female
Western Germany
0
6
Linke
2.08
-0.0817
0.00882
1.12
3.39e-06
-0.073
4769
2
25
Male
Western Germany
0
5
Gruene
1.79
0.214
0.00376
1.12
9.77e-06
0.19
4775
1.25
29
Female
Western Germany
1
7
Gruene
1.81
-0.559
0.00537
1.12
9.61e-05
-0.499
4777
2.5
72
Male
Western Germany
0
8
Linke
3.35
-0.855
0.0103
1.12
0.000434
-0.765
4778
2
44
Male
Western Germany
0
6
SPD
2.73
-0.731
0.00421
1.12
0.000128
-0.652
4782
1.75
30
Female
Western Germany
0
7
CDU-CSU
2.91
-1.16
0.00478
1.12
0.000367
-1.04
4784
4
40
Female
Western Germany
1
4
Would not vote
2.55
1.45
0.0132
1.12
0.00162
1.3
4791
4.25
76
Female
Western Germany
0
6
Other party
3.71
0.545
0.014
1.12
0.000241
0.488
4797
3
76
Female
Western Germany
1
7
CDU-CSU
3.34
-0.345
0.00478
1.12
3.24e-05
-0.308
4798
3.5
56
Female
Western Germany
0
6
SPD
2.85
0.654
0.0038
1.12
9.26e-05
0.583
4799
3
84
Female
Western Germany
0
8
SPD
3.73
-0.734
0.00589
1.12
0.000182
-0.655
4800
4.5
62
Male
Western Germany
0
4
CDU-CSU
2.95
1.55
0.00421
1.12
0.000579
1.39
4804
6
49
Female
Eastern Germany
0
7
AfD
4.91
1.09
0.00835
1.12
0.000571
0.974
4806
2.5
39
Female
Eastern Germany
0
8
Gruene
2.59
-0.0882
0.00516
1.12
2.29e-06
-0.0787
4807
1.25
44
Male
Eastern Germany
1
7
Gruene
2.21
-0.956
0.00484
1.12
0.000253
-0.853
4808
2.75
26
Female
Western Germany
0
7
CDU-CSU
2.84
-0.0911
0.00526
1.12
2.5e-06
-0.0813
4809
3
25
Male
Western Germany
0
6
Gruene
1.99
1.01
0.00414
1.12
0.000242
0.902
4811
3
83
Female
Eastern Germany
0
7
CDU-CSU
3.87
-0.869
0.00458
1.12
0.000198
-0.776
4812
4.25
67
Male
Eastern Germany
1
8
Gruene
2.8
1.45
0.00565
1.12
0.000675
1.29
4813
2.5
37
Male
Eastern Germany
0
7
Gruene
2.44
0.0564
0.00466
1.12
8.47e-07
0.0503
4815
2
31
Female
Western Germany
0
5
Gruene
1.8
0.203
0.0032
1.12
7.47e-06
0.181
4816
1.5
43
Male
Western Germany
0
5
CDU-CSU
2.82
-1.32
0.0032
1.12
0.000319
-1.18
4820
2
38
Male
Western Germany
0
6
Other party
3.14
-1.14
0.0119
1.12
0.000902
-1.02
4821
4.75
42
Male
Eastern Germany
0
7
Other party
3.46
1.29
0.0124
1.12
0.0012
1.16
4822
4.75
57
Male
Eastern Germany
0
7
FDP
3.68
1.07
0.00546
1.12
0.000359
0.957
4824
5.25
69
Male
Western Germany
0
6
SPD
3.16
2.09
0.00419
1.12
0.00104
1.86
4825
5
34
Male
Western Germany
0
5
Linke
2.09
2.91
0.00831
1.12
0.00404
2.6
4827
2.25
38
Male
Eastern Germany
1
7
SPD
2.52
-0.267
0.00676
1.12
2.77e-05
-0.239
4834
1
60
Male
Eastern Germany
0
5
Gruene
2.44
-1.44
0.00527
1.12
0.000621
-1.28
4839
2.5
58
Female
Eastern Germany
0
6
CDU-CSU
3.24
-0.736
0.00396
1.12
0.000122
-0.656
4840
3
55
Female
Western Germany
0
6
Gruene
2.41
0.586
0.00298
1.12
5.83e-05
0.523
4842
3.5
45
Female
Western Germany
1
7
Gruene
2.09
1.41
0.00442
1.12
0.000505
1.26
4843
1.25
24
Female
Western Germany
0
4
Gruene
1.47
-0.224
0.00405
1.12
1.16e-05
-0.2
4845
3.25
49
Male
Eastern Germany
1
7
CDU-CSU
3.02
0.233
0.00498
1.12
1.55e-05
0.208
4850
3
74
Female
Eastern Germany
0
7
SPD
3.4
-0.404
0.00505
1.12
4.71e-05
-0.361
4852
3
30
Male
Eastern Germany
0
6
Gruene
2.12
0.88
0.00475
1.12
0.00021
0.785
4854
3
46
Male
Eastern Germany
0
5
CDU-CSU
2.92
0.0813
0.00477
1.12
1.8e-06
0.0725
4860
2.5
57
Male
Western Germany
1
5
SPD
2.39
0.106
0.00501
1.12
3.19e-06
0.0942
4866
1.5
69
Male
Eastern Germany
0
6
Would not vote
3.95
-2.45
0.011
1.12
0.00381
-2.19
4867
1.25
59
Male
Western Germany
0
5
Gruene
2.37
-1.12
0.00357
1.12
0.000256
-1
4870
5.25
50
Female
Eastern Germany
0
7
AfD
4.93
0.322
0.00833
1.12
4.98e-05
0.288
4871
2
55
Female
Eastern Germany
0
6
CDU-CSU
3.18
-1.18
0.00396
1.12
0.000317
-1.06
4874
5.5
71
Female
Eastern Germany
0
8
AfD
5.49
0.0078
0.00892
1.12
3.13e-08
0.00697
4875
2.5
71
Female
Western Germany
0
4
CDU-CSU
3.01
-0.51
0.00494
1.12
7.33e-05
-0.455
4876
3.5
52
Female
Western Germany
0
5
Gruene
2.16
1.34
0.00306
1.12
0.000313
1.19
4877
1.75
55
Male
Western Germany
0
5
CDU-CSU
3.03
-1.28
0.00304
1.12
0.000283
-1.14
4878
2
51
Male
Western Germany
1
6
FDP
2.97
-0.968
0.00545
1.12
0.000293
-0.864
4884
2.5
83
Male
Western Germany
1
8
CDU-CSU
3.76
-1.26
0.00601
1.12
0.000547
-1.13
4887
2
56
Male
Western Germany
0
5
CDU-CSU
3.05
-1.05
0.00305
1.12
0.00019
-0.932
4896
4.5
39
Male
Western Germany
0
4
CDU-CSU
2.55
1.95
0.00404
1.12
0.000877
1.74
4900
2
61
Female
Western Germany
0
4
Gruene
2.11
-0.112
0.0045
1.12
3.24e-06
-0.1
4902
2
57
Male
Western Germany
0
7
Gruene
2.74
-0.743
0.00398
1.12
0.000125
-0.663
4904
2.5
65
Male
Eastern Germany
0
4
Would not vote
3.48
-0.976
0.0135
1.12
0.000746
-0.875
4907
2
50
Male
Western Germany
1
6
Linke
2.21
-0.212
0.00872
1.12
2.26e-05
-0.19
4910
2.5
75
Female
Western Germany
0
6
SPD
3.17
-0.673
0.00443
1.12
0.000115
-0.601
4911
1
41
Female
Eastern Germany
0
4
SPD
2.23
-1.23
0.00756
1.12
0.000654
-1.1
4918
4
51
Male
Western Germany
1
6
Gruene
2.08
1.92
0.00364
1.12
0.000766
1.71
4919
1
55
Female
Western Germany
0
5
Gruene
2.21
-1.21
0.00318
1.12
0.000265
-1.08
4921
4.75
28
Male
Western Germany
1
7
FDP
2.77
1.98
0.00749
1.12
0.00168
1.77
4923
2.25
55
Female
Eastern Germany
0
7
Linke
2.81
-0.562
0.00745
1.12
0.000135
-0.502
4925
2
65
Female
Western Germany
0
6
FDP
3.48
-1.48
0.00503
1.12
0.000626
-1.32
4926
3.5
58
Female
Western Germany
0
7
FDP
3.56
-0.0575
0.00507
1.12
9.59e-07
-0.0513
4927
4
34
Male
Eastern Germany
1
7
Other party
2.96
1.04
0.0139
1.12
0.000874
0.93
4933
1.75
72
Male
Eastern Germany
0
8
Gruene
3.25
-1.5
0.00549
1.12
0.000706
-1.34
4934
3.25
45
Female
Western Germany
0
4
Gruene
1.84
1.41
0.00369
1.12
0.00042
1.26
4938
3.75
42
Male
Eastern Germany
0
6
CDU-CSU
3.05
0.698
0.00425
1.12
0.000118
0.622
4939
2.25
38
Male
Eastern Germany
1
6
Gruene
1.9
0.35
0.00478
1.12
3.35e-05
0.312
4940
4.25
83
Male
Eastern Germany
0
8
SPD
3.85
0.396
0.00583
1.12
5.24e-05
0.353
4942
3.5
38
Female
Western Germany
0
5
Gruene
1.92
1.58
0.00297
1.12
0.000424
1.41
4943
5.5
25
Male
Eastern Germany
0
7
FDP
3.13
2.37
0.00699
1.12
0.00226
2.12
4949
6
73
Female
Eastern Germany
0
7
CDU-CSU
3.7
2.3
0.00394
1.12
0.00119
2.05
4951
1.5
69
Female
Western Germany
0
7
Gruene
2.86
-1.36
0.00403
1.12
0.000424
-1.21
4956
4.25
52
Male
Western Germany
0
4
FDP
2.94
1.31
0.00556
1.12
0.000546
1.17
4958
3
69
Female
Eastern Germany
0
8
CDU-CSU
3.83
-0.83
0.00403
1.12
0.000159
-0.741
4961
2
62
Male
Western Germany
0
6
CDU-CSU
3.35
-1.35
0.00289
1.12
0.0003
-1.2
4963
2.25
37
Female
Eastern Germany
0
6
SPD
2.56
-0.314
0.00565
1.12
3.18e-05
-0.28
4964
4.75
59
Male
Western Germany
0
6
AfD
4.93
-0.177
0.00769
1.12
1.39e-05
-0.159
4967
4.75
70
Female
Eastern Germany
0
7
Would not vote
4.08
0.673
0.0107
1.12
0.00028
0.602
4969
2
47
Female
Western Germany
1
4
Gruene
1.51
0.488
0.00436
1.12
5.91e-05
0.435
4971
1.5
30
Male
Western Germany
1
5
CDU-CSU
2.24
-0.739
0.00505
1.12
0.000158
-0.659
4976
5.75
49
Female
Eastern Germany
0
8
SPD
3.18
2.57
0.00553
1.12
0.0021
2.3
4977
4
29
Male
Western Germany
0
7
AfD
4.61
-0.613
0.0092
1.12
0.000199
-0.548
4978
4.25
42
Female
Western Germany
0
8
Other party
3.52
0.726
0.0138
1.12
0.000424
0.651
4984
6.25
67
Male
Western Germany
0
6
AfD
5.07
1.18
0.00806
1.12
0.000651
1.06
4986
2.5
24
Female
Western Germany
0
6
Gruene
1.88
0.621
0.00388
1.12
8.52e-05
0.554
4987
3.5
40
Male
Eastern Germany
0
8
Other party
3.63
-0.127
0.0132
1.12
1.25e-05
-0.114
4990
1.5
43
Female
Western Germany
0
6
Gruene
2.21
-0.707
0.00291
1.12
8.28e-05
-0.63
4992
1
30
Female
Eastern Germany
0
7
Gruene
2.23
-1.23
0.00489
1.12
0.000423
-1.1
4993
2.25
73
Male
Western Germany
0
5
SPD
3.03
-0.779
0.00483
1.12
0.000168
-0.695
4995
3.25
61
Female
Eastern Germany
1
6
CDU-CSU
2.93
0.321
0.00524
1.12
3.09e-05
0.287
4998
4
93
Female
Western Germany
0
8
CDU-CSU
4.2
-0.199
0.00549
1.12
1.24e-05
-0.178
4999
1.75
59
Female
Western Germany
0
7
Gruene
2.69
-0.935
0.00358
1.12
0.000178
-0.834
5000
4.25
20
Female
Western Germany
0
6
CDU-CSU
2.54
1.71
0.00516
1.12
0.000868
1.53
5001
1.75
57
Male
Eastern Germany
0
7
Gruene
2.79
-1.04
0.00432
1.12
0.000266
-0.926
5003
4
63
Female
Western Germany
0
7
SPD
3.17
0.831
0.00418
1.12
0.000165
0.741
5007
5.75
38
Male
Eastern Germany
0
7
CDU-CSU
3.19
2.56
0.00462
1.12
0.00174
2.29
5008
1.5
20
Female
Western Germany
1
7
Gruene
1.65
-0.154
0.00631
1.12
8.61e-06
-0.138
5010
5.5
84
Female
Western Germany
0
6
Gruene
2.91
2.59
0.00533
1.12
0.00204
2.31
5011
2.75
35
Male
Western Germany
0
5
FDP
2.85
-0.0983
0.00484
1.12
2.68e-06
-0.0878
5013
2.5
22
Male
Eastern Germany
0
8
Other party
3.32
-0.817
0.0146
1.12
0.000569
-0.732
5014
2.5
34
Female
Western Germany
0
5
FDP
2.74
-0.239
0.00507
1.12
1.65e-05
-0.213
5018
1
55
Female
Western Germany
1
5
SPD
2.27
-1.27
0.00534
1.12
0.000491
-1.13
5019
1
22
Male
Western Germany
1
4
Gruene
1.17
-0.174
0.00469
1.12
8.08e-06
-0.155
5021
3
40
Female
Western Germany
0
6
CDU-CSU
2.88
0.12
0.00321
1.12
2.63e-06
0.107
5022
1.25
59
Female
Eastern Germany
1
6
Gruene
2.17
-0.92
0.00498
1.12
0.000241
-0.821
5024
2.75
70
Male
Eastern Germany
0
6
CDU-CSU
3.54
-0.785
0.00419
1.12
0.000147
-0.7
5025
3
69
Male
Eastern Germany
0
8
Would not vote
4.35
-1.35
0.011
1.12
0.00117
-1.21
5026
4.5
61
Female
Eastern Germany
0
8
Linke
3.12
1.38
0.008
1.12
0.000878
1.23
5029
2.25
59
Female
Western Germany
0
6
CDU-CSU
3.21
-0.958
0.00272
1.12
0.000142
-0.854
5031
1.5
78
Female
Western Germany
0
4
Linke
2.56
-1.06
0.011
1.12
0.000707
-0.945
5033
1.75
21
Female
Western Germany
0
5
CDU-CSU
2.35
-0.6
0.00483
1.12
9.94e-05
-0.535
5038
2.25
46
Male
Western Germany
1
5
SPD
2.2
0.0452
0.00512
1.12
5.98e-07
0.0403
5042
2.5
61
Male
Western Germany
1
4
SPD
2.26
0.239
0.00597
1.12
1.95e-05
0.213
5043
4
78
Female
Western Germany
0
5
SPD
3.02
0.977
0.00528
1.12
0.000289
0.872
5050
1.25
41
Female
Western Germany
1
6
Gruene
1.81
-0.564
0.00376
1.12
6.81e-05
-0.503
5052
4
65
Male
Western Germany
1
6
CDU-CSU
3.04
0.955
0.00391
1.12
0.000204
0.852
5057
3.25
21
Male
Western Germany
0
7
SPD
2.54
0.713
0.00732
1.12
0.000213
0.637
5058
5
61
Female
Western Germany
0
5
SPD
2.73
2.27
0.00421
1.12
0.00124
2.03
5060
4
57
Male
Western Germany
1
6
CDU-CSU
2.91
1.09
0.00384
1.12
0.000261
0.975
5063
3.5
63
Female
Eastern Germany
0
5
Gruene
2.39
1.11
0.00552
1.12
0.000386
0.987
5064
2.75
40
Male
Eastern Germany
0
5
AfD
4.44
-1.69
0.00863
1.12
0.00142
-1.51
5068
2
65
Female
Western Germany
0
8
CDU-CSU
3.72
-1.72
0.00404
1.12
0.000679
-1.53
5069
4.5
67
Male
Western Germany
0
7
Gruene
2.92
1.58
0.00435
1.12
0.000624
1.41
5071
2.25
53
Female
Eastern Germany
0
7
Would not vote
3.78
-1.53
0.0103
1.12
0.0014
-1.37
5072
6.25
70
Male
Eastern Germany
1
8
AfD
5.21
1.04
0.00992
1.12
0.000621
0.931
5076
1.25
42
Female
Western Germany
0
6
FDP
3.08
-1.83
0.00471
1.12
0.000901
-1.63
5079
5
64
Male
Western Germany
0
5
CDU-CSU
3.18
1.82
0.00327
1.12
0.000614
1.62
5083
1
59
Male
Western Germany
0
5
Would not vote
3.53
-2.53
0.0103
1.12
0.00381
-2.26
5086
5
59
Male
Western Germany
0
6
CDU-CSU
3.3
1.7
0.00285
1.12
0.000468
1.52
5091
4
69
Male
Western Germany
0
4
CDU-CSU
3.07
0.932
0.00464
1.12
0.000231
0.832
5094
3.5
51
Male
Western Germany
0
5
CDU-CSU
2.96
0.54
0.00304
1.12
5.05e-05
0.482
5097
3.75
21
Male
Western Germany
0
7
AfD
4.47
-0.725
0.0101
1.12
0.000305
-0.648
5099
2.75
72
Female
Eastern Germany
0
8
SPD
3.57
-0.822
0.00519
1.12
0.000201
-0.734
5100
1.25
59
Male
Western Germany
1
5
SPD
2.43
-1.18
0.00504
1.12
0.000401
-1.05
5102
7
55
Male
Eastern Germany
0
6
CDU-CSU
3.28
3.72
0.00386
1.12
0.00306
3.32
5103
3.5
69
Female
Western Germany
0
7
Gruene
2.86
0.642
0.00403
1.12
9.5e-05
0.573
5104
2.5
78
Male
Eastern Germany
0
8
CDU-CSU
4.08
-1.58
0.00446
1.12
0.000634
-1.41
5105
2.25
23
Female
Western Germany
0
6
Gruene
1.86
0.388
0.00397
1.12
3.41e-05
0.346
5106
7
51
Female
Western Germany
0
8
Would not vote
3.91
3.09
0.0114
1.12
0.00633
2.77
5107
3.75
44
Male
Western Germany
0
5
CDU-CSU
2.84
0.911
0.00317
1.12
0.00015
0.812
5108
2.5
57
Male
Western Germany
1
5
CDU-CSU
2.7
-0.205
0.00398
1.12
9.51e-06
-0.182
5111
4
69
Male
Eastern Germany
0
8
SPD
3.61
0.387
0.00526
1.12
4.51e-05
0.346
5112
3.25
61
Male
Western Germany
0
7
CDU-CSU
3.54
-0.287
0.0033
1.12
1.55e-05
-0.256
5116
5
66
Female
Western Germany
0
7
SPD
3.22
1.78
0.00423
1.12
0.000764
1.59
5121
2
48
Male
Western Germany
0
5
CDU-CSU
2.91
-0.908
0.00307
1.12
0.000144
-0.809
5122
4
66
Male
Western Germany
0
6
CDU-CSU
3.42
0.579
0.00299
1.12
5.72e-05
0.516
5124
3.25
41
Female
Western Germany
0
4
CDU-CSU
2.49
0.758
0.00409
1.12
0.000134
0.676
5129
4.25
33
Female
Eastern Germany
0
5
AfD
4.23
0.0205
0.00992
1.12
2.4e-07
0.0183
5131
2.5
67
Female
Eastern Germany
1
7
CDU-CSU
3.23
-0.735
0.00501
1.12
0.000155
-0.656
5133
1.75
54
Male
Western Germany
1
5
Gruene
1.93
-0.178
0.00365
1.12
6.59e-06
-0.159
5135
3.75
80
Male
Eastern Germany
0
8
Other party
4.32
-0.567
0.0144
1.12
0.00027
-0.508
5141
1.5
32
Male
Eastern Germany
0
4
Linke
1.9
-0.401
0.0097
1.12
8.98e-05
-0.358
5142
4.75
78
Male
Eastern Germany
0
6
SPD
3.36
1.39
0.00571
1.12
0.000629
1.24
5149
5.5
54
Female
Western Germany
0
7
Would not vote
3.76
1.74
0.0102
1.12
0.0018
1.56
5152
2
42
Male
Eastern Germany
0
7
Gruene
2.53
-0.53
0.00444
1.12
7.12e-05
-0.473
5154
1.5
29
Female
Western Germany
0
6
Gruene
1.97
-0.465
0.0035
1.12
4.32e-05
-0.415
5155
3.25
65
Female
Western Germany
0
5
SPD
2.8
0.451
0.00437
1.12
5.08e-05
0.403
5161
3.25
56
Male
Eastern Germany
0
7
CDU-CSU
3.5
-0.246
0.00372
1.12
1.28e-05
-0.219
5165
1.75
22
Male
Eastern Germany
1
6
Other party
2.55
-0.803
0.0145
1.12
0.000546
-0.72
5166
4.5
32
Male
Eastern Germany
0
4
AfD
4.1
0.398
0.0103
1.12
9.38e-05
0.356
5167
3.25
67
Male
Eastern Germany
1
6
Linke
2.55
0.699
0.00857
1.12
0.000241
0.625
5168
1.5
39
Female
Western Germany
1
5
SPD
1.99
-0.492
0.00574
1.12
7.95e-05
-0.439
5170
3
34
Female
Western Germany
0
5
CDU-CSU
2.57
0.426
0.00365
1.12
3.77e-05
0.38
5171
2.5
35
Male
Western Germany
0
5
FDP
2.85
-0.348
0.00484
1.12
3.36e-05
-0.311
5173
4.75
66
Male
Western Germany
0
4
FDP
3.18
1.57
0.00644
1.12
0.000909
1.4
5175
2.5
18
Female
Western Germany
0
7
Gruene
1.98
0.522
0.00554
1.12
8.63e-05
0.466
5179
1.5
29
Male
Western Germany
1
7
Gruene
1.9
-0.402
0.00551
1.12
5.09e-05
-0.359
5185
3.25
59
Female
Western Germany
0
6
Would not vote
3.64
-0.39
0.00993
1.12
8.71e-05
-0.349
5186
1.75
61
Male
Western Germany
1
4
SPD
2.26
-0.511
0.00597
1.12
8.93e-05
-0.456
5187
4
77
Male
Western Germany
0
7
SPD
3.5
0.497
0.0049
1.12
6.92e-05
0.444
5190
2.5
56
Female
Eastern Germany
0
7
CDU-CSU
3.4
-0.904
0.00369
1.12
0.000172
-0.806
5196
3
52
Female
Eastern Germany
0
7
Would not vote
3.77
-0.767
0.0103
1.12
0.000351
-0.686
5197
3.75
49
Female
Eastern Germany
0
6
Gruene
2.36
1.39
0.0041
1.12
0.000455
1.24
5206
4.5
77
Male
Western Germany
1
8
AfD
5.28
-0.784
0.0115
1.12
0.000409
-0.702
5207
1.5
58
Male
Eastern Germany
1
5
Linke
2.19
-0.693
0.00894
1.12
0.000247
-0.62
5211
3.75
49
Male
Western Germany
1
6
Would not vote
3.2
0.549
0.0119
1.12
0.000208
0.491
5212
3.75
82
Female
Western Germany
0
5
FDP
3.57
0.184
0.00723
1.12
1.4e-05
0.164
5213
3
58
Female
Western Germany
0
7
SPD
3.08
-0.0828
0.00419
1.12
1.64e-06
-0.0739
5215
3
46
Female
Western Germany
0
6
SPD
2.67
0.327
0.00399
1.12
2.43e-05
0.291
5216
3.75
80
Male
Western Germany
1
5
CDU-CSU
3.1
0.649
0.00519
1.12
0.000125
0.579
5218
2.75
45
Male
Western Germany
1
5
CDU-CSU
2.5
0.252
0.00413
1.12
1.5e-05
0.225
5221
3.25
77
Male
Western Germany
0
8
CDU-CSU
4.02
-0.765
0.00468
1.12
0.000156
-0.683
5222
6.25
27
Male
Western Germany
0
5
FDP
2.71
3.54
0.00528
1.12
0.00378
3.16
5225
4.5
62
Female
Western Germany
1
5
Gruene
1.97
2.53
0.00418
1.12
0.00152
2.25
5228
1.5
44
Female
Western Germany
0
5
SPD
2.44
-0.936
0.0042
1.12
0.00021
-0.835
5231
6.25
73
Female
Eastern Germany
0
5
Other party
3.5
2.75
0.0158
1.12
0.00698
2.47
5233
1.75
52
Female
Western Germany
0
6
Gruene
2.36
-0.612
0.00291
1.12
6.21e-05
-0.546
5235
2.5
70
Male
Eastern Germany
1
4
CDU-CSU
2.77
-0.272
0.00775
1.12
3.28e-05
-0.243
5237
2.75
59
Male
Eastern Germany
1
8
FDP
3.56
-0.806
0.00698
1.12
0.00026
-0.72
5238
2.75
72
Female
Western Germany
0
4
SPD
2.72
0.0332
0.00604
1.12
3.82e-07
0.0297
5242
7
57
Female
Eastern Germany
0
6
Would not vote
3.65
3.35
0.0106
1.12
0.00687
3
5244
3.25
74
Male
Western Germany
0
6
FDP
3.72
-0.473
0.00558
1.12
7.15e-05
-0.422
5246
2.5
71
Female
Western Germany
1
4
FDP
2.82
-0.316
0.00825
1.12
4.73e-05
-0.282
5248
4.5
52
Male
Western Germany
0
5
AfD
4.6
-0.104
0.00783
1.12
4.89e-06
-0.0931
5249
6
39
Female
Western Germany
0
7
Would not vote
3.5
2.5
0.0107
1.12
0.00389
2.24
5251
4
29
Female
Western Germany
0
6
FDP
2.85
1.15
0.0054
1.12
0.000405
1.02
5254
1.25
66
Male
Eastern Germany
0
8
Linke
3.3
-2.05
0.00832
1.12
0.00201
-1.83
5255
2
52
Female
Western Germany
0
7
Gruene
2.56
-0.565
0.00348
1.12
6.32e-05
-0.503
5256
2.5
48
Male
Western Germany
0
4
FDP
2.87
-0.37
0.00543
1.12
4.26e-05
-0.33
5259
2.5
20
Female
Eastern Germany
0
6
SPD
2.27
0.23
0.00737
1.12
2.23e-05
0.205
5260
2.5
69
Female
Eastern Germany
0
8
Linke
3.26
-0.756
0.00818
1.12
0.000269
-0.676
5261
1
60
Female
Eastern Germany
1
6
Linke
2.34
-1.34
0.00863
1.12
0.000889
-1.2
5263
1.5
23
Female
Western Germany
0
6
SPD
2.28
-0.777
0.00584
1.12
0.000202
-0.693
5265
4
27
Male
Western Germany
0
4
AfD
3.97
0.0293
0.00906
1.12
4.49e-07
0.0262
5267
2.25
53
Female
Eastern Germany
1
4
CDU-CSU
2.39
-0.136
0.00771
1.12
8.2e-06
-0.122
5274
1.75
39
Male
Western Germany
1
7
Gruene
2.07
-0.324
0.0048
1.12
2.88e-05
-0.289
5276
1.75
56
Male
Western Germany
1
6
FDP
3.05
-1.3
0.00549
1.12
0.000534
-1.16
5278
1.75
64
Female
Western Germany
0
4
SPD
2.58
-0.829
0.00546
1.12
0.000215
-0.74
5282
2.5
68
Female
Eastern Germany
1
8
CDU-CSU
3.45
-0.955
0.00537
1.12
0.00028
-0.852
5283
4.5
81
Male
Eastern Germany
0
8
AfD
5.76
-1.26
0.00887
1.12
0.000808
-1.12
5285
1.75
33
Female
Western Germany
0
7
Gruene
2.24
-0.487
0.00411
1.12
5.56e-05
-0.434
5288
1.75
82
Male
Western Germany
0
6
FDP
3.86
-2.11
0.0064
1.12
0.00164
-1.89
5291
3
31
Female
Western Germany
0
5
Other party
2.73
0.273
0.0124
1.12
5.36e-05
0.245
5293
4.75
81
Male
Eastern Germany
0
8
FDP
4.29
0.456
0.00697
1.12
8.31e-05
0.407
5294
1.25
64
Female
Western Germany
0
8
CDU-CSU
3.7
-2.45
0.00404
1.12
0.00138
-2.18
5299
3.25
68
Female
Western Germany
0
8
CDU-CSU
3.77
-0.518
0.00406
1.12
6.21e-05
-0.462
5301
5.5
75
Female
Western Germany
0
8
SPD
3.58
1.92
0.0054
1.12
0.00114
1.72
5302
5.5
67
Male
Eastern Germany
0
8
FDP
4.05
1.45
0.00616
1.12
0.000739
1.29
5303
3.5
80
Female
Western Germany
1
8
FDP
3.78
-0.281
0.00826
1.12
3.75e-05
-0.251
5305
4.25
60
Female
Eastern Germany
0
8
SPD
3.37
0.885
0.00513
1.12
0.00023
0.79
5307
1.5
57
Female
Western Germany
0
6
CDU-CSU
3.17
-1.67
0.00271
1.12
0.000432
-1.49
5310
2
58
Male
Western Germany
1
5
SPD
2.41
-0.412
0.00503
1.12
4.87e-05
-0.367
5312
4.5
69
Female
Western Germany
1
7
SPD
2.91
1.59
0.00564
1.12
0.000812
1.42
5320
5.5
48
Female
Western Germany
0
6
CDU-CSU
3.02
2.48
0.00284
1.12
0.000997
2.21
5322
2
25
Male
Western Germany
0
5
Gruene
1.79
0.214
0.00376
1.12
9.77e-06
0.19
5331
2.75
21
Male
Eastern Germany
0
6
Other party
2.89
-0.145
0.0134
1.12
1.63e-05
-0.13
5333
1.75
26
Male
Western Germany
0
5
Linke
1.95
-0.204
0.00881
1.12
2.12e-05
-0.183
5340
2.75
53
Female
Western Germany
0
4
Gruene
1.97
0.776
0.00398
1.12
0.000137
0.692
5341
2.75
68
Male
Eastern Germany
0
7
FDP
3.87
-1.12
0.0058
1.12
0.000415
-0.998
5342
2.75
44
Female
Eastern Germany
1
5
Other party
2.64
0.112
0.0151
1.12
1.11e-05
0.101
--- ## Outlook: Other modeling options As we've said at the beginning of this session, we only looked at some of the basic confirmatory analysis methods. As you can imagine, however, `R` offers plenty of options more more complex statistical models as well. A few examples: - Structural equation models with [`lavaan`](https://lavaan.ugent.be/) - Multilevel/mixed-effects models with [`lme4`](https://cran.r-project.org/web/packages/lme4/index.html) - Bayesian regression models using [`brms`](https://paul-buerkner.github.io/brms/) --- class: center, middle # [Exercise](https://stefanjuenger.github.io/r-intro-gesis-2022/exercises/Exercise_4_1_3_Regression_Reporting.html) time 🏋️♀️💪🏃🚴 ## [Solutions](https://stefanjuenger.github.io/r-intro-gesis-2022/solutions/Exercise_4_1_3_Regression_Reporting.html) --- ## Extracurricular activities As it is such a simple and useful package, we recommend exploring the `broom` package a bit further. Alex Hayes, one authors of the package, [gave an interesting talk about it at the *RStudio* Conference in 2019](https://rstudio.com/resources/rstudioconf-2019/solving-the-model-representation-problem-with-broom/).