Exercícios de Distribuição Normal

Cálculo das probabilidades (distribição normal e tabela da normal padrão)

library(RcmdrMisc)
## Carregando pacotes exigidos: car
## Carregando pacotes exigidos: carData
## Carregando pacotes exigidos: sandwich

1. P(X<0) = 0,5

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x", ylab="Densidade",regions=list(c(0, 4)), col=c('#0080C0', '#BEBEBE'), legend=FALSE)

2. P(0<X<0,11) = 0,04380

plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x", 
          ylab="Densidade",regions=list(c(0, 0.11)),
          col=c('darkblue', '#BEBEBE'), legend=FALSE) 

3. P(-2,2<X<0,12) = P(-2,2<X<0) + P(0<X<0,12)

P(-2,2<X<0,12) = 0,48610 + 0,4776 = 0,53386

plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x", 
          ylab="Densidade",regions=list(c(-2.2, 0),c(0,0.12)),
          col=c('darkblue', 'skyblue'), legend=FALSE)

4. P(-1<x<2,1) = P(-1<x<0) + P(0<x<2,1)

0,34134 + 0,48214 = 0,82348

plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x", 
          ylab="Densidade",regions=list(c(-1, 0),c(0,2.1)),
          col=c('darkorange', 'yellow'), legend=FALSE)

5. P(0<X<1,83) = 0,46638

plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x", 
          ylab="Densidade",regions=list(c(0, 1.83)),
          col=c('darkgreen'), legend=FALSE)

6. P(-0,87<X<1,54) = P(-0,87<X<0) + P(0<X<1,54)

P(-0,87<X<1,54) = 0,30785 + 0,43822 = 0,74607

plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x", 
          ylab="Densidade",regions=list(c(-0.87, 0),c(0,1.54)),
          col=c('purple', 'darkblue'), legend=FALSE)

7. P(X=1,54) (favor explicar o motivo)

P(X=1,54) = 0

O resultado é zero porque x é igual a um número qualquer, isso quer dizer que a linha não apresenta área.

8. P(x>2,5) = 0,5 - 0,49379 = 0,00621

plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x", 
          ylab="Densidade",regions=list(c(2.5,4)),
          col=c('darkgreen'), legend=FALSE)

9. P(x>-2) = 0,47725 + 0,5 = 0,97725

plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x", 
          ylab="Densidade",regions=list(c(-2, 0),c(0,4)),
          col=c('darkred', 'darkblue'), legend=FALSE)