Yes, the sample size is >30, the distribution is not terribly skewed, and the samples are independent.
Yes it is convincing due to the low p-value:
n <- 36
x_bar <- 30.69
s <- 4.31
std_error <- s/sqrt(n)
pnorm(x_bar, 32, std_error)
## [1] 0.0341013
The p-value tells us that in repeated samples of 36 children, if the true mean were 32 months there would be about a 3.4% chance of getting a sample mean of 30.69 months or lower.
c(qnorm(0.05, x_bar, std_error), qnorm(0.95, x_bar, std_error))
## [1] 29.50845 31.87155
###(a)
# If the true IQ were 100 then a 90 percent interval would be:
c(qnorm(.05, 100, 6.5/sqrt(36)), qnorm(.95, 100, 6.5/sqrt(36)))
## [1] 98.21808 101.78192
# The sample mean of 118.2 is well outside that range, so there is convincing evidence of a difference.
###(b)
c(qnorm(.05, 118.2, 6.5/sqrt(36)), qnorm(.95, 118.2, 6.5/sqrt(36)))
## [1] 116.4181 119.9819
###(c)
# Yes, 100 is out of range of the CI calculated in (b).
“Sampling distribution” of the mean is the theoretical distribution we would achieve if we took repeated samples from a population and calculated the sample mean every time. The mean of the sampling distribution should be the same as the population mean (unbiased estimator.) The spread of the sampling distribution (i.e., standard error) goes down as the size of our samples goes up. The shape of the sampling distribution get more and more gaussian as the size of our samples goes up.
###(a)
pnorm(10500, 9000, 1000, lower.tail=F)
## [1] 0.0668072
###(b)
# Sampling distribution
###(c)
pnorm(10500, 9000, 1000/sqrt(15), lower.tail=F)
## [1] 3.133452e-09
###(d)
ggplot(data.frame(x = c(6000, 12000)), aes(x)) +
stat_function(fun = dnorm, args = list(mean = 9000, sd = 1000), aes(colour='Population')) +
stat_function(fun = dnorm, args = list(mean = 9000, sd = 1000/sqrt(15)), aes(colour='Sampling')) +
labs(title = "Sampling vs Population Distributions", x="Hours", y="Density") +
scale_colour_manual(name = "Distributions", values = c("red", "blue"))
###(e)
# Not using these methods with small sample sizes like 1 or 15.
The p-value will decrease because raising the value of n will have the effect of shrinking the standard error, i.e., the spread of the distribution, which will decrease the area under curve below the value in question.