library(RcmdrMisc)
## Carregando pacotes exigidos: car
## Carregando pacotes exigidos: carData
## Carregando pacotes exigidos: sandwich
.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)

#P( X < 0) = P(-3 < x < 0) = 0,5
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x",
ylab="Densidade",regions=list(c(-3, 0)),
col=c("Purple"), legend=FALSE)

#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("Purple"), legend=FALSE)

#P(-2,2<X<0,12) = 0,53386
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x",
ylab="Densidade",regions=list(c(-2.2, 0.12)),
col=c("purple"), legend=FALSE)

**#P(-1 < X < 2,1) = 0.82589
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x",
ylab="Densidade",regions=list(c(-1.01,0),c(0,2.1)),
col=c("Purple","darkblue"), legend=FALSE)

#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("Purple"), legend=FALSE)

#P(-0,87 < x < 1,54) = 0.74607
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x",
ylab="Densidade",regions=list(c(-0,87, 1,54)),
col=c("Purple","blue"), legend=FALSE)

#P(X > 2,5) = 0,00621
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x",
ylab="Densidade",regions=list(c(2.5,4)),
col=c("Purple"), legend=FALSE)

P(x > -2) = 0,97725
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="x",
ylab="Densidade",regions=list(c(-2,4)),
col=c("purple"), legend=FALSE)
