knitr::opts_chunk$set(echo = TRUE)
library(tinytex)
library(pracma)
Source files: [https://github.com/djlofland/DATA605_S2020/tree/master/]
I coulnd’t figure this one out. I found several references on the internet showing the solution, but couldn’t understand them sufficiently to feel good about providing an answer … that would have been just copying and cheating. So, I tried, but don’t know how to solve this.
Assumption: There is a uniform probability of failure each year over the 10 years. So the probability on any given year is \(\frac{1}{10}\).
P(x=n) = \((1-P)^{n-1}P\) where \(P = 0.1\)
Since we are interested in failure after year 8, we can look at the probability of failing on year 9 or failing on year 10.
P <- 0.1
prob_y9 <- (1 - P)^(9-1) * P
prob_y10 <- (1 - P)^(10-1) * P
(prob_y9or10 <- prob_y9 + prob_y10)
## [1] 0.08178877
mu <- 1/P
sigma <- sqrt((1-P)/P^2)
\(\mu = \frac{1}{P} = \frac{1}{0.1} =\) 10
\(\sigma = \sqrt{\frac{1-P}{P^2}} = \sqrt{\frac{1-0.1}{0.1^2}} =\) 9.486833
\(P(X \le k) = 1 - e^{\frac{-k}{\mu}}\)
\(P(X \ge k) = e^{\frac{-k}{\mu}}\)
We are given \(\mu = 10\)
P <- 0.1
mu <- 1 / P
x <- 8
(prob <- exp(-x/mu))
## [1] 0.449329
(sigma <- sqrt(1/P^2))
## [1] 10
\[\mu = \frac{1}{\lambda} = \frac{1}{0.1} = 10\]
\[\sigma = \sqrt{\frac{1}{\lambda^2}} = \sqrt{\frac{1}{0.1^2}} = 10\]
\(k=0, n=8, p=0.1\)
\[P(x=n) = \frac{n!}{k!(n-k)!}*p^k*(1-p)^{(n-k)}\]
p <- 0.1
n <- 8
k <- 0
(prob <- fact(n)/(fact(k)*fact(n-k))*p^k*(1-p)^(n-k) )
## [1] 0.4304672
(mu <- n * p)
## [1] 0.8
(sigma <- sqrt(n*p*(1-p)))
## [1] 0.8485281
\[\mu = n*p = 8 * 0.1 = 0.8\]
\[\sigma = \sqrt{n*p*(1-p))} = \sqrt{8*0.1*(1-0.1)} = 0.8485281\]
Rate is 1 per 10 years = 0.1
\(r = 0.1, t=8, k=0\)
\[Prob(k\text{ events in interval }t\text{ with rate }r) = \frac{(rt)^k * e^{-rt}}{k!}\]
\[P(0) = \frac{(0.1*8)^0 * e^{-0.1*8}}{0!} = e^{-0.1*8} = 0.449329\]
r <- 0.1
k <- 0
t <- 8
(prob <- ((r*t)^k * exp(-r*t))/fact(k))
## [1] 0.449329
(mu <- 0.1)
## [1] 0.1
(lambda <- 0.1)
## [1] 0.1
(sigma <- sqrt(lambda))
## [1] 0.3162278
\[\mu = \lambda = 0.1\]
\[\sigma = \sqrt{\lambda} = \sqrt{0.1} = 0.3162278\]