The final marks in a statistics course are normally distributed with a mean of 70 and a standard deviation of 10. The professor must convert all marks to letter grades. She decides that she wants 10% A’s, 30% B’s, 40% C’s, 15% D’s, and 5% F’s. Determine the cutoffs for each letter grade.
A grade 10% des etudiants B grades 30% des etudiants => 40% (A+B) C grades 40% => 80% (A+B+C) D gardes 15% => 95% (A+B+C+D) F gardes 5% => 100% (A+B+C+D+F)
repartition = c(0.10,0.40,0.80,0.95)
round(qnorm(repartition,lower.tail = FALSE)*10+70,0)
## [1] 83 73 62 54
pnorm(54)*10+70
## [1] 80
pnorm(83,70,10,lower.tail = FALSE)
## [1] 0.09680048
pnorm(83,70,10)-pnorm(72,70,10)
## [1] 0.3239398
pnorm(72,70,10)-pnorm(62,70,10)
## [1] 0.3674043
pnorm(62,70,10)-pnorm(53,70,10)
## [1] 0.1672899
pnorm(53,70,10)
## [1] 0.04456546
Ceux qui ont entre 81 et 100 represent 10% des etudiants et auront la note A. Ceux qui ont entre 73 et 81 represent 10% des etudiants et auront la note B. Ceux qui ont entre 62 et 72 represent 10% des etudiants et auront la note C. Ceux qui ont entre 54 et 61 represent 10% des etudiants et auront la note D. Ceux qui ont entre 73 et 81 represent 10% des etudiants et auront la note B.
round(qnorm(0.10,70,10, lower.tail = FALSE))
## [1] 83
round(qnorm(0.40,70,10, lower.tail = FALSE))
## [1] 73
round(qnorm(0.80,70,10, lower.tail = FALSE))
## [1] 62
round(qnorm(0.95,70,10, lower.tail = FALSE))
## [1] 54
round(qnorm(0.05,70,10, lower.tail = TRUE))
## [1] 54
library(ggplot2)
p1 <- ggplot(data = data.frame(x = c(30, 100)), aes(x)) +
stat_function(fun = dnorm, n = 101, args = list(mean = 70, sd = 10),color="red")+ xlab("Marks")+ ylab("Density")
p1
Mensa is an organization whose members possess IQs that are in the top 2% of the population. It is known that IQs are normally distributed with a mean of 100 and a standard deviation of 16. Find the minimum IQ needed to be a Mensa member.
q=40
pnorm(q,30,10)*0.5 + pnorm(q,40,10)*0.5
## [1] 0.6706724
prop=function(q){pnorm(q,30,10)*0.5 + pnorm(q,40,10)*0.5-0.9}
prop(49.5)
## [1] 0.001677907
uniroot(prop,c(0,120))
## $root
## [1] 49.39365
##
## $f.root
## [1] -1.099829e-07
##
## $iter
## [1] 11
##
## $init.it
## [1] NA
##
## $estim.prec
## [1] 6.103516e-05