inst/doc/nhstplot.R

## -----------------------------------------------------------------------------
library(nhstplot)

## -----------------------------------------------------------------------------
plotchisqtest(chisq = 8, df = 4)

## -----------------------------------------------------------------------------
test <- chisq.test(c(A = 37, B = 18, C = 25))
plotchisqtest(test)

## -----------------------------------------------------------------------------
set.seed(1)
y <- rbinom(10, 1, .4) ; x <- 2*y + rnorm(10)
fit1 <- glm(y ~ 1, family = binomial)
fit2 <- glm(y ~ x, family = binomial)
comp <- anova(fit1, fit2, test = "Chisq")
plotchisqtest(comp)

## -----------------------------------------------------------------------------
plotftest(f = 4, dfnum = 3, dfdenom = 5)

## -----------------------------------------------------------------------------
x <- rnorm(10) ; y <- x + rnorm(10)
fit <- lm(y ~ x)
plotftest(fit)

## -----------------------------------------------------------------------------
set.seed(1)
x <- rnorm(10) ; y <- x + rnorm(10)
fit1 <- lm(y ~ x)
fit2 <- lm(y ~ poly(x, 2))
comp <- anova(fit1, fit2)
plotftest(comp)

## -----------------------------------------------------------------------------
plotttest(t = 2, df = 10)

## -----------------------------------------------------------------------------
plotttest(2, 10, tails = "one")

## -----------------------------------------------------------------------------
plotttest(-2, 10, tails = "one")

## -----------------------------------------------------------------------------
test <- t.test(rnorm(10), rnorm(10))
plotttest(test)

## -----------------------------------------------------------------------------
test <- cor.test(rnorm(10), rnorm(10))
plotttest(test)

## -----------------------------------------------------------------------------
plotztest(z = 2)

## -----------------------------------------------------------------------------
plotztest(2, tails = "one")

## -----------------------------------------------------------------------------
plotztest(-2, tails = "one")

## -----------------------------------------------------------------------------
plotztest(-2, blank = TRUE)

## -----------------------------------------------------------------------------
plotztest(2, xmax = 10)

## -----------------------------------------------------------------------------
plotztest(2, theme = "blackandwhite")
plotztest(2, theme = "whiteandred")
plotztest(2, theme = "blueandred")
plotztest(2, theme = "greenandred")
plotztest(2, theme = "goldandblue")

## -----------------------------------------------------------------------------
plotftest(4, 3, 5, colorleft = "lightgreen", colorleftcurve = "red", colorright = "indianred", colorrightcurve = "blue", colorplabel = "darkgrey", colorcut = "#FFA500")

## -----------------------------------------------------------------------------
plotztest(2, colormiddle = "lightgreen", colormiddlecurve = "red", colorsides = "indianred", colorsidescurve = "blue", colorplabel = "darkgrey", colorcut = "#FFA500")

## -----------------------------------------------------------------------------
plotztest(2, fontfamily = "Helvetica")

## -----------------------------------------------------------------------------
plotztest(2, cutlinesize = 2, curvelinesize = 1)

## -----------------------------------------------------------------------------
plotztest(2.134553, signifdigitsz = 2)

Try the nhstplot package in your browser

Any scripts or data that you put into this service are public.

nhstplot documentation built on April 11, 2023, 5:54 p.m.