2 title: 'Week 6 problem set: Worked solutions'
3 subtitle: "Statistics and statistical programming \nNorthwestern University \nMTS 525"
9 ```{r setup, include=FALSE}
10 knitr::opts_chunk$set(echo = TRUE, messages = F)
13 ## Programming Questions
17 First we import the data.
20 raw_df = read.csv("~/Desktop/DeleteMe/Teaching/owan03.csv") # Note that I saved the file as a CSV for importing to R
26 Let's reshape the data
32 colnames(raw_df) <- c("None", "Low", "Medium","High")
34 # Gather gets all of the columns from the dataframe and
35 # use them as keys, with the value as the value from that cell.
36 # This gives us a "long" dataframe
37 df <- gather(raw_df, dose, weeks_alive)
39 # We want to treat dose as a factor, so we can group by it easier
40 df$dose <- as.factor(df$dose)
42 # Finally, when we look at it, we see some missing data (NA); this is because not all group sizes were the same.
43 # We can safely remove these.
44 df <- df[complete.cases(df),]
49 Now we're going to calculate summary statistics and create some visualizations
53 tapply(df$weeks_alive, df$dose, summary)
55 # Alternative way to do this using tidyverse
57 df %>% group_by(dose) %>% summarize_all(c('min','max','mean', 'IQR'))
61 When it comes to visualizations, we definitely want to use ggplot. We have lots of options for what to do.
67 h_plot = df %>% ggplot(aes(x=weeks_alive, # What to summarize
68 fill = dose # How to group by color
69 )) + geom_histogram(position = 'dodge', bins = 5)
72 # In this case, faceted histograms is probably better
74 h_facet = df %>% ggplot(aes(x=weeks_alive # What to summarize
75 )) + geom_histogram(bins = 5) + facet_grid(~dose)
80 d_plot = df %>% ggplot(aes(x=weeks_alive, # What to summarize
81 fill = dose # How to group by color
82 )) + geom_density(alpha = .2)
87 box_plot = df %>% ggplot(aes(y=weeks_alive,
92 # My favorite - ridgeline plots
94 # install.packages('ggridges')
98 ridge_plot = df %>% ggplot(aes(x=weeks_alive, y = dose)) +
99 geom_density_ridges(jittered_points = T, fill = 'orange') + theme_minimal()
104 It's a bit tough to tell, but the overall assumptions of normality and equal variance seem reasonable.
116 summary(aov(weeks_alive ~ dose, data = df))
120 This provides evidence that the group means are different.
124 T-test between None and Any, and between None and High.
129 t.test(df[df$dose == 'None', 'weeks_alive'], # Samples with no dose
130 df[df$dose != 'None','weeks_alive'] # Samples with any dose
133 # Or, using formula notation
134 t.test(weeks_alive ~ dose == 'None', data = df)
136 # T-test between None and High
138 t.test(df[df$dose == 'None', 'weeks_alive'], # Samples with no dose
139 df[df$dose == 'High','weeks_alive'] # Samples with high dose
142 # Formula notation is a bit tricker. I would probably create a temprorary dataframe
144 tmp = df %>% filter(dose %in% c('None', 'High'))
146 t.test(weeks_alive ~ dose, data = tmp)
150 These t-tests both support the idea that receiving a dose of RD40 reduces lifespan. However, we should not completely trust these p-values, since we are doing multiple comparisons. One option is to do a Bonferroni correction, where we only cnsider things significant if $\alpha < .05/m$ where $m$ is the number of tests. In this case, we would fail to reject the null for the second test because we would set $\alpha = .025$.
152 The Bonferroni correction is more conservative than it needs to be, ane there are other approaches; for example, the `TukeyHSD` function takes in an anova result and does post-hoc comparisons with corrections for all of the groups.
154 ## Statistical Questions
157 a) It is a sample statistic, because it comes from a sample.
158 b) Confidence intervals for proportions are equal to
160 $$p \pm z * \sqrt{ \frac{p*(1-p)}{n}}$$
162 For a 95% confidence interval, $z = 1.96$, so we can calculate it like this:
167 lower = .48 - 1.96 * sqrt(.48 * .52 / 1259)
169 upper = .48 + 1.96 * sqrt(.48 * .52 / 1259)
177 This means that we are 95% confident that the true proportion of Americans who support legalizing marijuana is between ~45% and ~51%.
179 c) We have a large enough sample, which is collected randomly, to assume that the distribution is normal.
180 d) The statement isn't justified, since our confidence interval include 50%
183 We can use the point estimate of the poll to estimate how large a sample we would need to have a confidence interval of a given width.
185 Basically, we want each half of the confidence interval to be 1%, i.e., $1.96 * \sqrt{\frac{.48 * .52}{n}} = .01$
187 We can solve for $n$:
189 $$\sqrt{\frac{.48 * .52}{n}} = .01/1.96$$
190 $$\frac{.48 * .52}{n} = (.01/1.96)^2$$
191 $$n = (.48 * .52)/(.01/1.96)^2$$
193 (.48 * .52)/(.01/1.96)^2
195 So, we need a sample of approximately 9,589
199 The question is whether there has been a change in the proportion over time. While the tools we have learned could allow you to answer that question, they assume that responses are independent. In this case, they are obviously not independent as they come from the same students.
203 a) We can test this with a $\chi^2$ test.
206 chisq.test(x = c(83,121,193,103), p = c(.18,.22,.37,.23))
210 # Calculate expected values
211 500 * c(.18,.22,.37,.23)
213 # Use the formula for chi-squared
214 chisq = (83-90)^2/90 + (121-110)^2/110 + (193-185)^2/185 + (103-115)^2/115
218 # We could then look up the chi-square distribution for 3 degrees of freedom
222 The p-value for this is large, meaning that we don't have evidence that the sample differs from the census distribution.
225 i) Opinion is the response and location is the explanatory variable, since it's unlikely that people move to a region based on their opinion.
226 ii) One hypothesis is that opinions differ by region. The null hypothesis is that opinion is independent of region, while the alternative hypothesis is that there is a relationship.
227 iii) We can again use a $\chi^2$ test.
231 x <- matrix(c(29,54,44,77,62,131,36,67), nrow = 4, # this makes a matrix with 4 rows
232 byrow=T) # And this says that we've entered it row by row
236 ## Empirical Questions
241 a) The unit of analysis is the customer. The dependent variable is the type of board purchased and the independent variable is gender. Males, females, and unkown gender customers are being compared. This is a two-way test.
243 b) The null hypothesis is that the board purchased is independent of the gender of the customer. The alternative hypothesis is that if we know the gender of the customer that will tell us something about the type of board they purchased.
245 c) A $\chi^2$ test found statistically significant evidence that board purchase behavior differs by gender. This difference is convincing, but it does directly not tell us what we really want to know, which is the difference between men and women. It could be possible that it is simply identifying a significant difference in the number of unknown gender customers across board types. Many of these concerns are addressed in the text and with additional tests, giving increased confidence in the reality of this difference.
247 d) Statistical tests help to give (or take away) confidence in a conclusion. People are not natively good at estimating how likely something is due to chance and tests help us to make these judgments. Choosing a statistical test is based on the question that you want to answer and the type of data that you have available to answer it. For example, if this were numeric data (e.g., the amount of money spent on electronics for men and women) then we could choose a t-test to compare those distributions.
252 a) These are counts for two categorical variables, so the procedure used was a $\chi^2$ test. The null hypothesis is that whether or not a blog is governed by one person is independent of whether it is on the left or the right.
254 b) It would be surprising to see these results by chance and it make sense to believe that this difference is real. However, the main reason to be skeptical is the way that the data are grouped. The authors could have grouped them differently (e.g., 1-2 people, 3-4 people, and 5+ people); if the decision on how to group was made after seeing the data then we have good reason to be skeptical.
260 # First we create the dataframe
261 df = data.frame(Governance=c('Individual','Multiple', 'Individual','Multiple'),
262 Ideology = c('Left','Left','Right','Right'),
263 Count = c(13,51,27,38))
265 # We can make sure it's the same by testing the Chi-squared
266 chisq.test(matrix(df$Count, nrow=2))
268 percentage_data = df %>%
269 group_by(Ideology) %>%
270 summarize(individual_ratio = sum(Count[Governance=='Individual']) / sum(Count),
271 group_count = sum(Count))
273 shaw_benkler_plot = percentage_data %>%
274 ggplot(aes(x=Ideology, y=individual_ratio * 100)) +
275 geom_bar(stat='identity', aes(fill=c('red','blue')), show.legend=F) +
276 ylab('Percentage of Blogs') + theme_minimal()
280 # If we want to add error bars, we need to calculate them (Note that ggplot could do this for us if we had raw data - always share your data!)
282 # I decided to use confidence intervals. The standard error is another reasonable choice
284 # Remember that for a binomial distribution (we can consider individual/non-individual as binomial), confidence intervals are mu +- x * sqrt((p*(1-p))/n)
286 ci_95 = 1.96 * sqrt(percentage_data$individual_ratio * (1 - percentage_data$individual_ratio)/percentage_data$group_count)
288 shaw_benkler_plot + geom_errorbar(aes(ymin=(individual_ratio-ci_95)*100, ymax=(individual_ratio + ci_95)*100),
295 The error bars do overlap in this case, but that actually doesn't tell us whether they are significantly different.
297 d) We don't need to be very worried about the base rate fallacy because the sizes of both groups are about the same.