library(RcmdrMisc)
## Warning: package 'RcmdrMisc' was built under R version 4.0.5
## Loading required package: car
## Warning: package 'car' was built under R version 4.0.5
## Loading required package: carData
## Loading required package: sandwich
## Warning: package 'sandwich' was built under R version 4.0.5
x <- seq(-3.3, 3.3, length.out=1000)
plotDistr(x, dnorm(x, mean=0, sd=1), cdf=FALSE, xlab="x", ylab="Densidade",
          regions=list(c(-1, 1)), col=c('#0080C0'), legend=FALSE)

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

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

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

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

plotDistr(x, dnorm(x, mean=0, sd=1), cdf=FALSE, xlab="x", ylab="Densidade",
            regions=list(c(0, 3)), col=c("tomato3"), legend=FALSE)

plotDistr(x, dnorm(x, mean=0, sd=1), cdf=FALSE, xlab="x", ylab="Densidade",
            regions=list(c(0, 1),c(1,3)), col=c("red","royalblue"), legend=FALSE)

p<-pnorm(2.03)
p<-p-0.5
p
## [1] 0.4788217