Inference

Linking Probability and Data

Robert W. Walker

Discrete Inference

Code
library(fontawesome)
library(DT)
library(magrittr)
options(scipen = 8)
library(tidyverse)
library(gganimate)
library(hrbrthemes)
theme_set(theme_ipsum_rc())

Inference for Binomial Type Variables

How do we learn from data?

It is probably better posed as, what can we learn from data?

The Big Idea

Inference

In the most basic form, learning something about data that we do not have from data that we do. In the jargon of statistics, we characterize the probability distribution of some feature of the population of interest from a sample drawn randomly from that population.

Quantities of Interest:

  • Single Proportion: The probability of some qualitative outcome with appropriate uncertainty.1

  • Single Mean: The average of some quantitative outcome with appropriate uncertainty.1

The Big Idea

Inference

In the most basic form, learning something about data that we do not have from data that we do. In the jargon of statistics, we characterize the probability distribution of some feature of the population of interest from a sample drawn randomly from that population.

Quantities of Interest:

  • Compare Proportions: Compare key probabilities across two groups with appropriate uncertainty.1

  • Compare Means: Compare averages/means across two groups with appropriate uncertainty.1

The Big Idea

Inference

In the most basic form, learning something about data that we do not have from data that we do. In the jargon of statistics, we characterize the probability distribution of some feature of the population of interest from a sample drawn randomly from that population.

Study Planning

Plan studies of adequate size to assess key probabilities of interest.

Inference for Data

Of two forms:

  1. Binary/Qualitative
  2. Quantitative

We will first focus first on the former. But before we do, one new concept.

The standard error

It is the degree of variability of a statistic just as the standard deviation is the variability in data.

  • The standard error of a proportion is \sqrt{\frac{\pi(1-\pi)}{n}} while the standard deviation of a binomial sample would be \sqrt{n*\pi(1-\pi)}.

  • The standard deviation of a sample is s while the standard error of the mean is \frac{s}{\sqrt{n}}. The average has less variability than the data and it shrinks as n increases.

Let’s think about an election….

Consider election season. The key to modeling the winner of a presidential election is the electoral college in the United States. In almost all cases, this involves a series of binomial variables.

  • Almost all states award electors for the statewide winner of the election and DC has electoral votes.

  • We have polls that give us likely vote percentages at the state level. Call it p.win for the probability of winning. We can then deploy rbinom(1000, size=1, p.win) to derive a hypothetical election.

  • Rinse and repeat to calculate a hypothetical electoral college winner. But how do we calculate p-win?

  • We infer it from polling data

Qualitative: The Binomial

Is entirely defined by two parameters, n – the number of subjects – and \pi – the probability of a positive response. The probability of exactly x positive responses is given by:

Pr(X = x | \pi, n) = {n \choose x} \pi^x (1-\pi)^{n-x}

The binomial is the canonical distribution for binary outcomes. Assuming all n subjects are alike and the outcome occurs with \pi probability,1 then we must have a sample from a binomial. A binomial with n=1 is known as a Bernoulli trial

Features of the Binomial

Two key features:

  1. Expectation: n \cdot \pi or number of subjects times probability, \pi \textrm{ if } n=1.

  2. Variance is n \cdot \pi \cdot (1 - \pi) or \pi(1-\pi) \textrm{ if } n=1 and standard deviation is \sqrt{n \cdot \pi \cdot (1 - \pi)} or \sqrt{\pi(1-\pi)} \textrm{ if } n=1.

Data

Now let’s grab some data and frame a question.

Code
load(url("https://github.com/robertwwalker/DADMStuff/raw/master/Big-Week-6-RSpace.RData"))

Berkeley Admissions

What is the probability of being admitted to UC Berkeley Graduate School?1

I have three variables:

  1. Admitted or not

  2. Gender

  3. The department an applicant applied to.

Admission is the key.

Code
library(janitor)  #<<
UCBTab <- data.frame(UCBAdmissions) %>%
    reshape::untable(., .$Freq) %>%
    select(-Freq)
UCBTab %>%
    tabyl(Admit)  # Could also use UCBTab %$% table(Admit) 
    Admit    n percent
 Admitted 1755   0.388
 Rejected 2771   0.612

The proportion is denoted as \hat{p}. We can also do this with table.

Code
UCBTab %>%
    DT::datatable(., fillContainer = FALSE, options = list(pageLength = 8),
        rownames = FALSE)

A Visual

Code
library(viridisLite)
UCBTab %>%
    ggplot(.) + aes(x = Gender, fill = Admit) + geom_bar() + scale_fill_viridis_d()

The Idea

Suppose we want to know \pi(Admit) – the probability of being admitted – with 90% probability.

We want to take the data that we saw and use it to infer the likely values of \pi(Admit).

Three interchangeable methods

  1. Resampling/Simulation

  2. Exact binomial computation

  3. A normal approximation

Method 1: Resampling

Suppose I have 4526 chips with 1755 green and 2771 red.

I toss them all on the floor

and pick them up, one at a time,

record the value (green/red),

put the chip back,
[NB: I put it back to avoid getting exactly the same sample every time.]

and repeat 4526 times.

Each count of green chips as a proportion of 4526 total chips constitutes an estimate of the probability of Admit.

I wrote a little program to do just this – ResampleProps.

remotes::install_github("robertwwalker/ResampleProps")

Resampling Result

Code
library(ResampleProps)
RSMP <- ResampleProp(UCBTab$Admit, k = 10000, tab.col = 1) %>%
    data.frame(Pi.Admit = ., Gender = as.character("All"), frameN = 1)
quantile(RSMP$Pi.Admit, probs = c(0.05, 0.95))
   5%   95% 
0.376 0.400 

What is our estimate of \pi with 90% confidence?

The probability of admission ranges from 0.376 to 0.4.

A Plot

Code
library(ggthemes)
RSMP %>%
    ggplot(., aes(x = Pi.Admit)) + geom_density(outline.type = "upper", color = "maroon") +
    labs(x = expression(pi)) + theme_minimal()

Another Way: Exact binomial

That last procedure is correct but it is overkill.

  1. With probability of 0.05, how small could \pi be to have gotten 1755 of 4526 or more?

  2. With probability 0.95, how big could \pi be to have gotten fewer than 1755 of 4526?

Code
UCBTab %$%
    table(Admit)  #<<
Admit
Admitted Rejected 
    1755     2771 

binom.test does exactly this.

binom.test()

Code
UCBTab %$%
    table(Admit) %>%
    binom.test(conf.level = 0.9)

    Exact binomial test

data:  .
number of successes = 1755, number of trials = 4526, p-value
<2e-16
alternative hypothesis: true probability of success is not equal to 0.5
90 percent confidence interval:
 0.376 0.400
sample estimates:
probability of success 
                 0.388 
Code
Plot.Me <- binom.test(1755, 1755 + 2771, conf.level = 0.9)$conf.int %>%
    data.frame()

With 90% probability, now often referred to as 90% confidence to avoid using the word probability twice, the probability of being admitted ranges between 0.3758 and 0.3998.

Illustrating the Binomial

Code
UCBTab %$%
    table(Admit) %>%
    binom.test(conf.level = 0.9)

    Exact binomial test

data:  .
number of successes = 1755, number of trials = 4526, p-value
<2e-16
alternative hypothesis: true probability of success is not equal to 0.5
90 percent confidence interval:
 0.376 0.400
sample estimates:
probability of success 
                 0.388 
Code
c(pbinom(1755, 1755 + 2771, 0.399834), pbinom(1754, 1755 + 2771, 0.3757924))
[1] 0.05 0.95
Code
Binomial.Search <- data.frame(x = seq(0.33, 0.43, by = 0.001)) %>%
    mutate(Too.Low = pbinom(1755, 1755 + 2771, x), Too.High = 1 - pbinom(1754,
        1755 + 2771, x))
Binomial.Search %>%
    pivot_longer(cols = c(Too.Low, Too.High)) %>%
    ggplot(., aes(x = x, y = value, color = name)) + geom_line() + geom_hline(aes(yintercept = 0.05)) +
    geom_hline(aes(yintercept = 0.95)) + geom_vline(data = Plot.Me, aes(xintercept = .),
    linetype = 3) + labs(title = "Using the Binomial to Search", color = "Greater/Lesser",
    x = expression(pi), y = "Probability")

A Third Way: The normal approximation

As long as n and \pi are sufficiently large, we can approximate this with a normal distribution. This will also prove handy for a related reason.

As long as n*\pi > 10, we can write that a standard normal z describes the distribution of \pi, given n – the sample size and \hat{p} – the proportion of yes’s/true’s in the sample.

Pr(\pi) = \hat{p} \pm z \cdot \left( \sqrt{\frac{\hat{p}*(1-\hat{p})}{n}} \right)

R implements this in prop.test. By default, R implements a modified version that corrects for discreteness/continuity. To get the above formula exactly, prop.test(table, correct=FALSE).

A first look at hypotheses

z = \frac{\hat{p} - \pi}{\sqrt{\frac{\pi(1-\pi)}{n}}}

With some proportion calculated from data \hat{p} and some claim about \pi – hereafter called an hypothesis – we can use z to calculate/evaluate the claim. These claims are hypothetical values of \pi. They can be evaluated against a specific alternative considered in three ways:

  • two-sided, that is \pi = value against not equal.

  • \pi \geq value against something smaller.

  • \pi \leq value against something greater.

In the first case, either much bigger or much smaller values could be evidence against equal. The second and third cases are always about smaller and bigger; they are one-sided.

Just as z has metric standard deviations now referred to as standard errors of the proportion, the z here will measure where the data fall with respect to the hypothetical \pi.

With z sufficiently large, and in the proper direction, our hypothetical \pi becomes unlikely given the evidence and should be dismissed.

Three hypothesis tests

Code
(Z.ALL <- (0.3877596 - 0.5)/(sqrt(0.5^2/4526)))  # Calculate z 
[1] -15.1

The estimate is 15.1 standard errors below the hypothesized value.

Two Sided

\pi = 0.5 against \pi \neq 0.5.

Code
pnorm(-abs(Z.ALL)) + (1 - pnorm(abs(Z.ALL)))
[1] 7.85e-52

Any |z| > 1.64 – probability 0.05 above and below – is sufficient to dispense with the hypothesis.

One-Sided

\pi \leq 0.5 against \pi \gt 0.5.

With 90% confidence, z > 1.28 is sufficient.

\pi \geq 0.5 against \pi \lt 0.5.

With 90% confidence, z < -1.28 is sufficient.

The normal approximation

Code
prop.test(table(UCBTab$Admit), conf.level = 0.9, correct = FALSE)

    1-sample proportions test without continuity correction

data:  table(UCBTab$Admit), null probability 0.5
X-squared = 228, df = 1, p-value <2e-16
alternative hypothesis: true p is not equal to 0.5
90 percent confidence interval:
 0.376 0.400
sample estimates:
    p 
0.388 

R reports the result as z^2 not z which is \chi^2 not normal; we can obtain the z by taking a square root: \sqrt{228.08} \approx 15.1

This approximation yields an estimate of \pi, with 90% confidence, that ranges between 0.376 and 0.4.

A Cool Consequence of Normal

The formal equation defines:

z = \frac{\hat{p} - \pi}{\sqrt{\frac{\pi(1-\pi)}{n}}}

Some language:

  1. Margin of error is \hat{p} - \pi. [MOE]

  2. Confidence: the probability coverage given z [two-sided].

  3. We need a guess at the true \pi because variance/std. dev. depend on \pi. 0.5 is common because it maximizes the variance; we will have enough no matter what the true value.

Algebra allows us to solve for n.

n = \frac{z^2 \cdot \pi(1-\pi)}{(\hat{p} - \pi)^2}

Example

Estimate the probability of supporting an initiative to within 0.03 with 95% confidence. Assume that the probability is 0.5 [it maximizes the variance and renders a conservative estimate – an upper bound on the sample size]

Code
Sample.Size <- function(MOE, B.pi = 0.5, Conf.lev = 0.95) {
    My.n <- ((qnorm((1 - Conf.lev)/2)^2) * (B.pi * (1 - B.pi)))/MOE^2
    Necessary.sample <- ceiling(My.n)
    return(Necessary.sample)
}
Sample.Size(MOE = 0.03, B.pi = 0.5, Conf.lev = 0.95)
[1] 1068

I need 1068 people to estimate support to within plus or minus 0.03 with 95% confidence.

In the Real World

A real poll. They do not have quite enough for a 3% margin of error. But 1006 is enough for a 3.1 percent margin of error…

Code
Sample.Size(MOE = 0.031, B.pi = 0.5, Conf.lev = 0.95)
[1] 1000

One More Oddity

What is our estimate of \pi with 90% confidence?

The probability of admission ranges from 0.376 to 0.4.

If we wish to express this using the normal approximation, a central interval is the observed proportion plus/minus z times the standard error of the proportion SE(\hat{p}) = \sqrt{\frac{\hat{p}(1-\hat{p})}{n}} NB: The sample value replaces our assumed true value because \pi is to be solved for. For 90%, the probability of admissions ranges from

Code
0.3877596 + qnorm(c(0.05, 0.95)) * (sqrt(0.3877596 * (1 - 0.3877596)/4526))
[1] 0.376 0.400

Back to the Story

Does the probability of admission depend on whether the applicant is Male or Female?

Analysis by Group

Code
library(janitor)
UCBTab %>%
    tabyl(Gender, Admit) %>%
    adorn_totals("col")
 Gender Admitted Rejected Total
   Male     1198     1493  2691
 Female      557     1278  1835
Code
UCBTab %>%
    tabyl(Gender, Admit) %>%
    adorn_percentages("row")
 Gender Admitted Rejected
   Male    0.445    0.555
 Female    0.304    0.696
Code
UCBTF <- UCBTab %>%
    filter(Gender == "Female")
UCBTF.Pi <- ResampleProp(UCBTF$Admit, k = 10000) %>%
    data.frame(Pi.Admit = ., Gender = as.character("Female"), frameN = 2)  # Estimates for females
UCBTM <- UCBTab %>%
    filter(Gender == "Male")
UCBTM.Pi <- ResampleProp(UCBTM$Admit, k = 10000) %>%
    data.frame(Pi.Admit = ., Gender = as.character("Male"), frameN = 2)  # Estimates for males

Binomial Result: Males

Code
UCBTM %$%
    table(Admit) %>%
    binom.test(., conf.level = 0.9)

    Exact binomial test

data:  .
number of successes = 1198, number of trials = 2691, p-value =
0.00000001
alternative hypothesis: true probability of success is not equal to 0.5
90 percent confidence interval:
 0.429 0.461
sample estimates:
probability of success 
                 0.445 

The probability of being admitted, conditional on being Male, ranges from 0.43 to 0.46 with 90% confidence.

The Thought Experiment: Male

Code
UCBTM.Pi %>%
    ggplot(., aes(x = Pi.Admit)) + geom_density(color = "maroon") + labs(x = expression(pi))

Binomial Result: Females

Code
UCBTF %$%
    table(Admit) %>%
    binom.test(., conf.level = 0.9)

    Exact binomial test

data:  .
number of successes = 557, number of trials = 1835, p-value <2e-16
alternative hypothesis: true probability of success is not equal to 0.5
90 percent confidence interval:
 0.286 0.322
sample estimates:
probability of success 
                 0.304 

The probability of being of Admitted, given a Female, ranges from 0.286 to 0.322 with 90% confidence.

The Thought Experiment: Female

Code
UCBTF.Pi %>%
    ggplot(., aes(x = Pi.Admit)) + geom_density(color = "maroon") + labs(x = expression(pi))

Succinctly

Female: from 0.286 to 0.322
Male: from 0.43 to 0.46
All: from 0.3758 to 0.3998

A Key Visual

Code
UCB.Pi <- bind_rows(UCBTF.Pi, UCBTM.Pi)
UCB.Pi %>%
    ggplot(., aes(x = Gender, y = Pi.Admit, fill = Gender)) + geom_violin() +
    geom_label(aes(x = 1.5, y = 0.375), label = "Too small to be male \n Too large to be female?",
        size = 14, fill = "black", color = "white", inherit.aes = FALSE) + guides(size = "none") +
    labs(x = "") + scale_fill_viridis_d()
Code
UCB.Pi <- bind_rows(UCBTF.Pi, UCBTM.Pi, RSMP)
UCB.Pi %>%
    ggplot(., aes(x = Pi.Admit, fill = Gender)) + geom_density(alpha = 0.5) +
    theme_minimal() + scale_fill_viridis_d() + transition_states(frameN, state_length = 40,
    transition_length = 20) + enter_fade() + exit_fade() -> SaveAnim
anim_save(SaveAnim, renderer = gifski_renderer(height = 500, width = 1000),
    filename = "img/Anim1.gif")

Can We Measure the Difference?

How much more likely are Males to be admitted when compared to Females?

We can take the difference in our estimates for Male and Female.

Code
UCB.Diff <- UCB.Pi %>% filter(frameN != 1) %>% select(Pi.Admit, Gender) %>% mutate(obs = rep(seq(1:10000),2)) %>% pivot_wider(., id_cols = obs, values_from=Pi.Admit, names_from=Gender) %>% mutate(Diff = Male - Female)
quantile(UCB.Diff$Diff, probs=c(0.05,0.95))
   5%   95% 
0.118 0.165 
Code
ggplot(UCB.Diff) + aes(x = Diff) + geom_density() + labs(title = "Difference in Probability of Admission",
    subtitle = "[Male - Female]")

Or Use the Normal Approximation

[\hat{p}_{M} - \hat{p}_{F}] \pm z*\sqrt{ \underbrace{\frac{\hat{p}_{M}(1-\hat{p}_{M})}{n_{M}}}_{Males} + \underbrace{\frac{\hat{p}_{F}(1-\hat{p}_{F})}{n_{F}}}_{Females}}

Code
# prop.test(table(UCBTab$Gender,UCBTab$Admit), conf.level=0.9,
# correct=FALSE)
UCBTab %$%
    table(Gender, Admit) %>%
    prop.test(conf.level = 0.9, correct = FALSE)

    2-sample test for equality of proportions without continuity
    correction

data:  .
X-squared = 92, df = 1, p-value <2e-16
alternative hypothesis: two.sided
90 percent confidence interval:
 0.118 0.165
sample estimates:
prop 1 prop 2 
 0.445  0.304 

With 90% confidence, a Female is 0.118 to 0.165 [0.1416] less likely to be admitted.

The Standard Error of the Difference

Following something akin to the FOIL method, we can show that the variance of a difference in two random variables is the sum of the variances minus twice the covariance between them.

Var(X - Y) = Var(X) + Var(Y) - 2*Cov(X,Y)

If we assume [or recognize it is generally unknownable] that the male and female samples are independent, the covariance is zero, and the variance of the difference is simply the sum of the variance for male and female, respectively, and zero covariance.

SE(\hat{p}_{M} - \hat{p}_{F}) = \sqrt{ \underbrace{\frac{\hat{p}_{M}(1-\hat{p}_{M})}{n_{M}}}_{Males} + \underbrace{\frac{\hat{p}_{F}(1-\hat{p}_{F})}{n_{F}}}_{Females}}

The chi-square and the test of independence

The sum of k squared standard normal (z or Normal(0,1)) variates has a \chi^2 distribution with k degrees of freedom. Two sample tests of proportions can be reported using the chi-square metric as well. R’s prop.test does this by default.

Inference for Data

Of two forms:

  1. Binary/Qualitative (Proportions)
  2. Quantitative (Means)

We will now turn to the latter.

Inference for Quantitative Data

The central limit theorem – or, more aptly, central limit theorems – demonstrates that the sample mean is normally distributed under some – varying – set of conditions.

Let’s Have a Brief Look

Uniform

Code
library(radiant)
result <- clt(dist = "Uniform", m = 1000)
plot(result, stat = "mean", bins = 50)

Exponential

Code
result <- clt(dist = "Exponential", m = 1000, expo_rate = 4)
plot(result, stat = "mean", bins = 50)

Application: Expenditures

What is the average level of expenditure by Ethnicity?

Why do we focus on the average? Under general conditions, the average has a known probability distribution even if the distribution of the underlying data is unknown. This is a result of the central limit theorem and a generic property of averaging. We can derive this distribution, it is known as t and has one parameter: degrees of freedom.

The t distribution

Results from the combination of a normal random variable in the numerator and a \chi^2 random variable in the denominator. Both should generically hold from the central limit theorem.

  • Student’s t distribution generically describes the distribution of the difference between a sample mean and the true mean.

  • It has one parameter, the degrees of freedom.

Expenditures

First, a look at the data on expenditures.

Code
load(url("https://github.com/robertwwalker/DADMStuff/raw/master/DiscriminationCADSS.RData"))
## Cutting Discrimination$Age into Discrimination$Age.Cohort
Discrimination$Age.Cohort <- cut(Discrimination$Age, include.lowest = FALSE,
    right = TRUE, breaks = c(0, 5, 12, 17, 21, 50, 95))
WH <- Discrimination %>%
    filter(Ethnicity %in% c("White not Hispanic", "Hispanic"))
datatable(WH)
Code
(BasePlot <- ggplot(WH, aes(x = Expenditures)) + geom_density(color = "red") +
    theme_minimal() + labs(y = ""))

Another plot

Code
library(crosstalk)
library(plotly)
shared_WH <- crosstalk::SharedData$new(WH)
Plot1 <- ggplot(shared_WH, aes(x = Ethnicity, y = Expenditures, color = Ethnicity)) +
    geom_jitter() + theme_minimal() + labs(y = "")
p2 <- ggplotly(Plot1)
bscols(widths = c(1, 11, 12), "", list(filter_checkbox("Ethnicity", "Ethnicity",
    shared_WH, ~Ethnicity, inline = TRUE), filter_checkbox("Age.Cohort", "Age.Cohort",
    shared_WH, ~Age.Cohort, inline = TRUE), p2))

Method 1: Resampling

Suppose I have 777 chips that each contain an expenditure

I toss them all on the floor

and pick them up, one at a time,

record the value,

put the chip back,
[NB: I put it back to avoid getting exactly the same sample every time.]

and repeat this to create a sample of n=777.

Use random sampling to sample the mean/average 10000 times.

Each average of 777 chips/expenditures constitutes an estimate of the average expenditure.

Code
WH.Means <- data.frame(Mean.Expenditure = ResampleMean(WH$Expenditures))

A Visual

Code
(ggplot(WH, aes(x = Expenditures)) + geom_density() + theme_ipsum_rc())/(ggplot(WH.Means,
    aes(x = Mean.Expenditure)) + theme_ipsum_rc()) + geom_density() + theme_ipsum_rc()

Average Expenditures: A 90% Interval

What is the middle 90% of the sampled averages?

Code
(ResQ <- quantile(WH.Means$Mean.Expenditure, probs = c(0.05, 0.95)))
   5%   95% 
16974 19238 
Code
ResQD <- data.frame(ResQ = ResQ, Height2 = 5e-05)

A Cowplot without Proper Scaling

A Decent Visualization

Code
BasePlot + geom_area(data = ResQD, aes(x = ResQ, y = Height2), fill = "blue",
    color = "blue", alpha = 0.2, outline.type = "full")

A Parametric Alternative

Under general conditions, the sample and population mean can be described by the t_{df} distribution with a single parameter – degrees of freedom [df] – and metric standard errors of the mean: \frac{s}{\sqrt{n}} as follows:

t_{df} = \frac{\overline{x} - \mu}{\frac{s}{\sqrt{n}}}

Given any observed sample of data, only two features of the aforementioned equation remain unknown: \mu – the true mean – and t_{df}. Solving for \mu yields:

\mu = \overline{x} - t_{df} \cdot \left( \frac{s}{\sqrt{n}} \right)

Putting It To Work

Code
(Summaries <- WH %>%
    summarise(Exp.Mean = mean(Expenditures), Exp.SD = sd(Expenditures), Count = n()))
  Exp.Mean Exp.SD Count
1    18101  19580   777
Code
WH %$%
    t.test(Expenditures, conf.level = 0.9)  #<<

    One Sample t-test

data:  Expenditures
t = 26, df = 776, p-value <2e-16
alternative hypothesis: true mean is not equal to 0
90 percent confidence interval:
 16944 19258
sample estimates:
mean of x 
    18101 

With 90% confidence, average expenditures [for White not Hispanic and Hispanic] range between 1.694^{4} and 1.926^{4} dollars per DDS client.

Disparities in Expenditures?

Code
ggplot(WH, aes(x = Ethnicity, y = Expenditures, fill = Ethnicity)) + geom_violin() +
    theme_ipsum_rc()

Two Groups?

Code
WH %>%
    filter(Ethnicity == "White not Hispanic") %$%
    t.test(Expenditures, conf.level = 0.9)

    One Sample t-test

data:  Expenditures
t = 24, df = 400, p-value <2e-16
alternative hypothesis: true mean is not equal to 0
90 percent confidence interval:
 23001 26394
sample estimates:
mean of x 
    24698 
Code
WH %>%
    filter(Ethnicity == "Hispanic") %$%
    t.test(Expenditures, conf.level = 0.9)

    One Sample t-test

data:  Expenditures
t = 14, df = 375, p-value <2e-16
alternative hypothesis: true mean is not equal to 0
90 percent confidence interval:
  9736 12395
sample estimates:
mean of x 
    11066 

Comparing Means

There are two [generic] ways to compare means:
1. The resampling approach
2. t-tests

Comparing Means by Resampling

The method is similar to the approach for comparing proportions. We will:
1. Take a random sample of the same size as the original for each group with replacement.
2. Calculate the average for each group and the difference in the averages.
3. Repeat steps 1 and 2 k times for k samples.

The Resampling Distribution of the Difference

Code
WNHExp <- Discrimination %>%
    filter(Ethnicity %in% c("White not Hispanic"))
HExp <- Discrimination %>%
    filter(Ethnicity %in% c("Hispanic"))
Expenditure.Difference <- data.frame(Diff = ResampleProps::ResampleDiffMeans(WNHExp$Expenditures,
    HExp$Expenditures))
Expenditure.Difference %>%
    ggplot(., aes(x = Diff)) + geom_density() + theme_minimal() + labs(x = "Average Difference in Average White and Hispanic Expenditures")

The t-test

For independent samples, the Behrens-Fisher problem dictates that comparisons of means have implications for the variance that must be reconciled. In short, we must assume that the variance and standard deviation of the samples are either the same [t] or different [Welch – the default].

In Welch’s case, the standard error is given by:

s_{\overline{x_{1}} - \overline{x_{2}}} = \sqrt{\frac{s^{2}_{1}}{n_{1}} + \frac{s^{2}_{2}}{n_{2}}} though the degrees of freedom follow a formula that involves the kurtosis of the samples [s^{4}].

Code
Discrimination %>%
    filter(Ethnicity %in% c("White not Hispanic", "Hispanic")) %>%
    t.test(Expenditures ~ Ethnicity, data = ., conf.lev = 0.9)

    Welch Two Sample t-test

data:  Expenditures by Ethnicity
t = -10, df = 743, p-value <2e-16
alternative hypothesis: true difference in means between group Hispanic and group White not Hispanic is not equal to 0
90 percent confidence interval:
 -15785 -11479
sample estimates:
          mean in group Hispanic mean in group White not Hispanic 
                           11066                            24698 
Code
Discrimination %>%
    filter(Ethnicity %in% c("White not Hispanic", "Hispanic")) %>%
    t.test(Expenditures ~ Ethnicity, data = ., conf.lev = 0.9, var.equal = TRUE)

    Two Sample t-test

data:  Expenditures by Ethnicity
t = -10, df = 775, p-value <2e-16
alternative hypothesis: true difference in means between group Hispanic and group White not Hispanic is not equal to 0
90 percent confidence interval:
 -15803 -11461
sample estimates:
          mean in group Hispanic mean in group White not Hispanic 
                           11066                            24698 

Paired t-test

Twinsberg

The paired t-test is a single sample average applied to the measured difference. The key is knowing who is matched with whom and believing that there is at least some variation in both outcomes that depends on the unit in question.

There is a linguistic distinction; this is an average difference instead of the previous difference in averages. The language describes the order of operation. For the paired comparison, I must know what to subtract from what.

Take the example of Concrete.

Twelve distinct batches of concrete are subjected to an additive. Does the additive strengthen concrete?

Code
Concrete %>%
    datatable()

The Average Difference

For each batch, we can calculate the difference between those with and without an additive. To do so, we need mutate. Let’s plot it.

Code
Concrete <- Concrete %>%
    mutate(Difference = Additive - No.Add)
hist(Concrete$Difference)

Resampling

Code
Concrete.Diff <- data.frame(Sampled.Mean.Difference = ResampleMean(Concrete$Difference))
quantile(Concrete.Diff$Sampled.Mean.Difference, probs = c(0.025, 0.975))
 2.5% 97.5% 
 58.3 262.5 

Graphic

Code
Concrete.Diff %>%
    ggplot() + aes(x = Sampled.Mean.Difference) + geom_density() + theme_ipsum_rc()

t-test

Code
t.test(Concrete$Difference)

    One Sample t-test

data:  Concrete$Difference
t = 3, df = 11, p-value = 0.01
alternative hypothesis: true mean is not equal to 0
95 percent confidence interval:
  37.3 279.4
sample estimates:
mean of x 
      158 

With 95% confidence, the additive increases the average break-weight of the concrete by 37.3 to 279.4 pounds.

An Inference Map

With proportions: If we claim a value of \pi, then use it for the standard error. If not, use the data.

With quantities: If comparing them, are samples independent or dependent? All the relevant quantities are known [or assumed] functions of the data.

For differences, the magic number is nearly always zero – no difference.

Code Summary

Discrete

For one proportion:

  • ResampleProps::ResampleProp(vec.data, k=1000, tab.col=1)
  • binom.test(x, n, alternative="?", p=0.5, conf.level=0.95)
  • prop.test(x, n, alternative="?", p=0.5, conf.level=0.95, correct=TRUE)

For two proportions:

  • prop.test(x=c(10,20), n=c(50, 50), alternative="?", p=0.5, conf.level=0.95, correct=TRUE)

Quantities

For one mean:

  • ResampleMeans::ResampleMean(vec.data, k=1000)
  • t.test(x, alternative="?", mu=0, conf.level=0.95)

For two means:

  • ResampleDiffMeans(vec.1, vec.2, k=1000)

  • Two types:

    • Independent: t.test(x, y, alternative="?", mu=0, conf.level=0.95, paired=FALSE, var.equal=FALSE)
    • Paired: t.test(x, y, alternative="?", mu=0, conf.level=0.95, paired=TRUE)

```

A Workflow

  1. Do we want an hypothesis test or a confidence interval?

  2. Choose a level of confidence/significance/probability.

  3. If hypothesis test, derive the relevant critical value by combining the reference distribution with the level of confidence/significance/probability. What value of z or t would be required to reject the hypothesis? If an confidence interval, how many standard errors from the mean are covered by the given level of probability.

  4. If an hypothesis test, calculate the test statistic.

  5. Compute the confidence interval or compare the test statistic to the relevant critical value.