1 - pnorm(q = 979, mean = 1300, sd = sqrt(40000))
## [1] 0.9457531
Answer: 0.9458
1-pnorm(q = 8340, mean = 11000, sd = sqrt(1960000))
## [1] 0.9712834
Answer: 0.9713
pnorm(q = 85000000, mean = 80000000, sd = 3000000) - pnorm(q = 83000000, mean = 80000000, sd = 3000000)
## [1] 0.1108649
Answer: 0.1109
qnorm(.86, mean = 456, sd = 123)
## [1] 588.8793
Answer: 589
qnorm(.07, mean = 6.13, sd = 0.06)
## [1] 6.041453
qnorm(.93, mean = 6.13, sd = 0.06)
## [1] 6.218547
Answer: Lower Limit: 6.04 Upper Limit: 6.22
qnorm(.55, mean = 78.8, sd = 9.8)
## [1] 80.03148
qnorm(.20, mean = 78.8, sd = 9.8)
## [1] 70.55211
Answer: C???s are between 71 and 80.
qnorm(.55, mean = 21.2, sd = 5.4)
## [1] 21.87857
Answer: 21.9
Less than 11 means <= 10. Using binomial CDF at x = 10, n = 151, p = .09:
pbinom(10, size = 151, prob = 0.09)
## [1] 0.191967
Answer: 0.192
Since we are using a sample, the standard deviation of the sample will be the standard deviation of the population diveded by the square root of the sample size.
Once we have that, we establish the normal distribution and find the area of the CDF above the given value, 48.83.
n <- 147
sd <- 7
sd_sample <- sd/sqrt(n)
p <- 1 - pnorm(48.83, mean = 48, sd = sd_sample)
p
## [1] 0.07527348
Answer: 0.0753
Same process as question 9.
n <- 68
pop_mean <- 91
pop_sd <- 10
sample_sd <- pop_sd/sqrt(n)
p <- 1-pnorm(93.54, mean = pop_mean, sd = sample_sd)
p
Answer: 0.0181
pearson_Z_score <- function(r) {
return(0.5*(log((1+r)/(1-r))))
}
pearson_SEM <- function(n) {
return(1/sqrt(n-3))
}
# find area between 4% and 10%
mean <- pearson_Z_score(0.07)
sem <- pearson_SEM(540)
p4 <- pnorm(pearson_Z_score(0.04), mean, sem)
p10 <- pnorm(pearson_Z_score(0.10), mean, sem)
round(p10 - p4, 4)
## [1] 0.5153
pearson_Z_score <- function(r) {
return(0.5*(log((1+r)/(1-r))))
}
pearson_SEM <- function(n) {
return(1/sqrt(n-3))
}
# find the area *below* 19 (inclusion) and *above* 27, inclusive.
mean <- pearson_Z_score(0.23)
sem <- pearson_SEM(602)
p19 <- pnorm(pearson_Z_score(0.19), mean, sem)
p27 <- 1 -pnorm(pearson_Z_score(0.27), mean, sem)
round(p19 + p27, 4)
## [1] 0.301
mean <- 3.9
sd <- 0.8
n <- 208
sample_sd = sd/sqrt(n)
alpha <- 1 - .80
p_critical <- 1 -alpha/2
z_score <- qnorm(p_critical)
lower_bound <- mean - z_score*sample_sd
upper_bound <- mean + z_score*sample_sd
round(lower_bound, 1)
## [1] 3.8
round(upper_bound, 1)
## [1] 4
Lower Bound: 3.8 Upper Bound: 4
mean <- 16.6
sd <- 11
n <- 7472
sample_sd = sd/sqrt(n)
alpha <- 1 - .98
p_critical <- 1 -alpha/2
z_score <- qnorm(p_critical)
lower_bound <- mean - z_score*sample_sd
upper_bound <- mean + z_score*sample_sd
round(lower_bound, 1)
## [1] 16.3
round(upper_bound, 1)
## [1] 16.9
Lower Bound: 16.3 Upper Bound: 16.9
Step 1. Choose the picture which best describes the problem.
Question 15 Picture
The picture in the top right describes the problem.
Step 2. Write your answer below.
abs(qt(0.05, df = 26))
## [1] 1.705618
Answer: 1.705618
Picture shows “-t”, so showing the absolute value above.
383.6, 347.1, 371.9, 347.6, 325.8, 337
Using these measurements, construct a 90% confidence interval for the mean level of helium gas present in the facility. Assume the population is normally distributed.
Step 1. Calculate the sample mean for the given sample data. (Round answer to 2 decimal places)
values <- c(383.6, 347.1, 371.9, 347.6, 325.8, 337)
n <- 6
mean <- mean(values)
round(mean,2)
## [1] 352.17
352.17
Step 2. Calculate the sample standard deviation for the given sample data. (Round answer to 2 decimal places)
sd <- sd(values)
round(sd, 2)
## [1] 21.68
21.68
Step 3. Find the critical value that should be used in constructing the confidence interval. (Round answer to 3 decimal places)
Since we have fewer than 30 observations, and don’t know the population SD, we will use t-score instead of z-score.
alpha <- 1 - .90
p_critical <- 1 - alpha/2
t_score = qt(p_critical, 5)
sample_sd = sd/sqrt(n)
lower_bound <- mean - t_score*sample_sd
upper_bound <- mean + t_score*sample_sd
Step 4. Construct the 90% confidence interval. (Round answer to 2 decimal places)
round(lower_bound, 2)
## [1] 334.34
round(upper_bound, 2)
## [1] 370
Step 1. Find the critical value that should be used in constructing the confidence interval. (Round answer to 3 decimal places)
alpha <- 1 - .80
p_critical <- 1 - alpha/2
n <- 16
mean <- 46.4
sd <- 2.45
sample_sd <- sd/sqrt(n)
t_score = qt(p_critical, n - 1)
lower_bound = mean - t_score*sample_sd
upper_bound = mean + t_score*sample_sd
Step 2. Construct the 80% confidence interval. (Round answer to 1 decimal place)
round(lower_bound, 1)
## [1] 45.6
round(upper_bound, 1)
## [1] 47.2
#Margin of Error (Sample) = Critical Value (z) * SE
#Critical value = z, i.e:
alpha = 1 - .99
p_critical <- 1 - alpha
z <- qnorm(.995)
sd <- 1.9
mean <- 8
#We know the Margin of Error, ME = 0.13
#We also know that the Standard Error, i.e. the sample standard deviation, is ME/z.
ME <- 0.13
SE = ME/z
#We know SE = sd/sqrt(n), therefore: sd/SE = sqrt(n), therefore: (sd/SE)^2 = n
n <- (sd/SE)^2
n
## [1] 1417.277
Rounding up: n = 1418
Margin of Error (Sample) = 0.19 = Critical Value (z) * SE
Critical value = z, i.e:
alpha = 1 - .95
p_critical <- 1 - alpha/2
sd <- sqrt(3.610)
mean <- 12.6
z <- qnorm(p_critical)
ME <- 0.19
SE <- ME/z
# SE = sd/sqrt(n), therefore: sd/SE = sqrt(n), therefore: (sd/SE)^2 = n
n <- (sd/SE)^2
Rounding up: 385
Step 1. Suppose a sample of 2089 tenth graders is drawn. Of the students sampled, 1734 read above the eighth grade level. Using the data, estimate the proportion of tenth graders reading at or below the eighth grade level. (Write your answer as a fraction or a decimal number rounded to 3 decimal places)
proportion <- 1 -(1734/2089)
Step 2. Suppose a sample of 2089 tenth graders is drawn. Of the students sampled, 1734 read above the eighth grade level. Using the data, construct the 98% confidence interval for the population proportion of tenth graders reading at or below the eighth grade level. (Round your answers to 3 decimal places)
n <- 2089
alpha <- 1 - .98
p_critical <- 1 - alpha/2
z_critical <- qnorm(p_critical)
p_hat <- proportion
#Margin of Error (Proportions)
ME_prop <- z * sqrt((p_hat * (1 - p_hat))/n)
lower_bound <- p_hat - (z_critical * ME_prop) - (0.5 / n)
upper_bound <- p_hat + (z_critical * ME_prop) + (0.5 / n)
round(lower_bound,3)
## [1] 0.132
round(upper_bound,3)
## [1] 0.208
Step 1. Suppose a sample of 474 tankers is drawn. Of these ships, 156 had spills. Using the data, estimate the proportion of oil tankers that had spills. (Write your answer as a fraction or a decimal number rounded to 3 decimal places)
proportion = 156/474
round(proportion,3)
## [1] 0.329
Step 2. Suppose a sample of 474 tankers is drawn. Of these ships, 156 had spills. Using the data, construct the 95% confidence interval for the population proportion of oil tankers that have spills each month. (Round your answers to 3 decimal places)
n <- 474
p <- 156/n
z_crit_95 <- qnorm(1-.05/2)
ME_proportion <- sqrt((p * (1 - p))/n)
lower <- p - (z_crit_95 * ME_proportion) - (0.5/n)
upper <- p + (z_crit_95 * ME_proportion) + (0.5/n)
round(lower, 3)
## [1] 0.286
round(upper, 3)
## [1] 0.372