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

1- P(Z < 0)= 0,5

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(-3, 0)), col=c('green'), legend=FALSE)

2- P(0 < Z > 0,11)= 0,4380

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

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

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

P(-2,2 < Z < 0,12)= 0,9637

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(-2.2, 0),c(0,0.12)), col=c('yellow','red'), legend=FALSE)

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

P(-1 < Z < 2,1)= 0,6826/2 + 0,48214

P(-1 < Z < 2,1)= 0,3413 + 0,48214

P(-1 < Z < 2,1)= 0,82344

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(-1, 0),c(0,2.1)), col=c('black','blue'), legend=FALSE)

5- P(0 < Z < 1,83)= 0,46638

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(0, 1.83)), col=c('pink'), legend=FALSE)

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

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

P(-0,87 < Z < 1,54)= 0,74607

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(-0.87, 0),c(0,1.54)), col=c('green','purple'), legend=FALSE)

7- P(Z = 1,54) (favor explicar o motivo)

P(Z = 1,54)= 0

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(1.54)), col=c('green'), legend=FALSE)

Explicação: Neste caso em específico onde a variável é congruente com um valor da tabela, a probabilidade desta relação será 0. Afinal, não haverá área a ser calculada já que seria representado apenas por uma linha reta.

8- P(Z > 2,5)= 0,5 - 0,49379

P(Z > 2,5)= 0,00621

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(2.5, 10)), col=c('darkred'), legend=FALSE)

9- P(Z > -2)= 0,9544/2 + 0,5

P(Z > -2)= 0,4772 + 0,5

P(Z > -2)= 0,9772

.x <- seq(-3.291, 3.291, length.out=1000)    
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(-2, 10)), col=c('darkgreen'), legend=FALSE)