Investigación sobre la librería FastGraph

Presente unas pequeñas instrucciones para graficar un valor critico y un P-value, para las distribuciones Z, T, F, Chi^2 y algunos ejemplos graficos.

Para presentar P. (Z)<1.96, donde Z es normal estandar.

ShadeDist(xshade=Chi_f2,“dchisq”,parm1=gl2,lower.tail=FALSE,sub=paste(“VC:”,VC2,“Fg”,chi_f2))

ShadeDist(c(-1,1)*qnorm(0.975),lower.tail=FALSE)

P(T)>1.7, Donde T es t distribuido con 19 d.f.

ShadeDist(c(-1.7,1.7),“dt”,19,col=c(“blue”,“hotpink”))

Prueba F

F_Anova<-summary(Modelo_Estimado) $ fstatistic [1]

gl_num<-summary(Modelo_Estiamdo) $ fstatistic [2]

gl_den<-summary(Modelo_Estiamdo) $ fstatistic [3]

F_VC<-qf(0.95,gl_num,gl_den,lower.tail=FALSE) ShadeDist(xshade=F_Anova,“df”,gl_num,gl_den,lower.tail=FALSE,col=c(“black”,“red”),sub=paste(“VC:”,F_VC"“,”Fc",F_Anova))

Chi-cuadrado, distribución con 4 d.f.

ShadeDist(6.8,“dchisq”,4,lower.tail=FALSE)

Ejemplos Graficos.
library(fastGraph)
shadeDist(qchisq(0.05,25,lower.tail = FALSE),ddist="dchisq",parm1=25,lower.tail=FALSE)

library(fastGraph)
shadeDist(qchisq(0.05,10,lower.tail = FALSE),ddist = "dchisq",parm1 = 10,lower.tail = FALSE)

library(fastGraph)
shadeDist(25,ddist = "dchisq",
          parm1 = 30,lower.tail = FALSE,
          col = c("black","red"),sub=paste(c(qchisq(0.05,30,lower.tail = FALSE))))