| Title: | Mathijs Deen's Miscellaneous Auxiliaries | 
| Date: | 2025-03-19 | 
| Version: | 2.0.0 | 
| Maintainer: | Mathijs Deen <dev@mathijsdeen.com> | 
| Description: | Provides a variety of functions useful for data analysis, selection, manipulation, and graphics. | 
| Depends: | R (≥ 4.2) | 
| Imports: | car, graphics, grDevices, lme4, MASS, methods, performance, stats | 
| Suggests: | ClusterBootstrap, glmmTMB, VGAM | 
| License: | GPL-3 | 
| URL: | https://github.com/mathijsdeen/MDMA | 
| BugReports: | https://github.com/mathijsdeen/MDMA/issues | 
| Encoding: | UTF-8 | 
| LazyData: | true | 
| RoxygenNote: | 7.3.2 | 
| NeedsCompilation: | no | 
| Packaged: | 2025-03-19 15:28:04 UTC; 20604229 | 
| Author: | Mathijs Deen [aut, cre] | 
| Repository: | CRAN | 
| Date/Publication: | 2025-03-19 16:00:02 UTC | 
inRange
Description
Return which values are in a certain range
%inRange% indicates which values are in a certain range, including the
boundaries of the range.
Usage
lhs %inRange% rhs
Arguments
| lhs | numeric vector. | 
| rhs | numeric vector of length 2 with the bounds of the range. | 
Value
%inRange% returns a logical vector of length(lhs), indicating which
values of lhs are and are not in range rhs. Boundaries of rhs are included.
Author(s)
Mathijs Deen
See Also
Examples
a <- seq(0, 100, 5)
r <- c(40, 70)
cbind(a,
      'a %inRange% r' = a %inRange% r,
      'a %withinRange% r' = a %withinRange% r)
Inverse value matching
Description
Evaluates whether the left hand side argument is not in the right hand side argument.
Usage
lhs %ni% rhs
Arguments
| lhs | left hand side. | 
| rhs | right hand side. | 
Details
The %ni% function negates the %in% operator.
Value
The function returns a vector of the same length as lhs.
Author(s)
Mathijs Deen
Examples
c(1,2,3) %ni% c(1,2)
withinRange
Description
Return which values are within a certain range
%withinRange% indicates which values are in a certain range, excluding
the boundaries of the range.
Usage
lhs %withinRange% rhs
Arguments
| lhs | numeric vector. | 
| rhs | numeric vector of length 2 with the bounds of the range. | 
Value
%withinRange% returns a logical vector of length(lhs), indicating which
values of lhs are and are not in range rhs. Boundaries of rhs are excluded.
Author(s)
Mathijs Deen
See Also
Examples
a <- seq(0, 100, 5)
r <- c(40, 70)
cbind(a,
      'a %inRange% r' = a %inRange% r,
      'a %withinRange% r' = a %withinRange% r)
Cost-effectiveness analysis
Description
Perform a cost-effectiveness analysis. Or a cost-utility analysis.
Usage
CEA(data, group, cost, effect, B = 5000, currency = "euro")
Arguments
| data | a  | 
| group | group variable in  | 
| cost | cost variable in  | 
| effect | effect variable in  | 
| B | number of bootstrap samples. | 
| currency | currency unit. See ?currency2unicode for options that will return
the a Unicode symbol that will be used in plot.CEA and plot.CEAC. If the parameter
is not listed, the parameter itself will be used. This makes it possible to input
a custom Unicode hex (e.g.,  | 
Value
CEA returns a list (class CEA) with the following elements:
| stats | a  | 
| diff.C.true | Observed difference in costs. | 
| diff.E.true | Observed difference in effects. | 
| ICER.true | Observed incremental cost-effectiveness ratio. | 
| gr1 | First level of group variable. | 
| gr2 | Second level of group variable. | 
| currencyUC | The currency. Either in raw form (parameter  | 
Author(s)
Mathijs Deen
Examples
CEA(gnomes, insulationMethod, Costs, diffHATS, 5000, "acorns") |>
  plot()
Cost-effectiveness acceptability curve
Description
Create data for cost-effectiveness acceptability curve
Usage
CEAC(x)
Arguments
| x | object of class  | 
Value
CEAC returns data that can be plotted using plot.CEAC.
Author(s)
Mathijs Deen
Examples
CEA(gnomes, insulationMethod, Costs, diffHATS, 1000, "acorns") |>
  CEAC() |>
  plot(xlim = c(0,200))
QIDS depression data
Description
The QIDS dataset consists of 100 observations of people that were
clinically diagnosed with a major depressive disorder and who filled out the QIDS-SR questionnaire. The data were simulated.
Usage
QIDS
Format
the following variables are available:
-  QIDS: QIDS-SR total score.
-  Depression: an indicator whether the individual was diagnosed with a depression or not.
Author(s)
Mathijs Deen
Calculate (pseudo) R^2 for vglm objects
Description
Calculate (pseudo) R^2 for vglm objects
Usage
R2.vglm(
  model,
  method = c("mcfadden", "nagelkerke", "efron", "coxsnell", "tjur")
)
Arguments
| model | a  | 
| method | method for calculation of  | 
Value
R2.vglm returns R^2.
Author(s)
Mathijs Deen
Examples
if(require("VGAM")){
  fit <- vglm(Species ~ Sepal.Length,
              family = multinomial(),
              data = iris)
  R2.vglm(fit)
}
Area under the curve
Description
Calculate the area under the curve.
Usage
auc(x, ...)
Arguments
| x | object of class  | 
| ... | other arguments (none are used at the moment). | 
Value
returns the area under the curve for a roc class object.
Author(s)
Mathijs Deen
Examples
a <- roc(QIDS$QIDS, QIDS$depression, c("Yes","No"), "Yes")
auc(a)
Checks for linear model
Description
Perform checks for a linear model regarding influential cases and collinearity numerically and graphically.
Usage
check(object, ...)
Arguments
| object | object of class  | 
| ... | other parameters (none are used at the moment). | 
Value
check returns a list containing two matrices with statistics regarding
influential cases and a vector of variance inflation factors. Furthermore, it
produces diagnostics plots.
The return list contains three elements:
 
- influence, a data.frame, with observations in the model,
and the following variables:
| predicted.value | The value predicted by the model. | 
| residual | The raw residual. | 
| std.residual | The standardized residual. | 
| dfb.<...> | DFBETAs for the variables in the model. | 
| dffit | DFFIT value. | 
| cov.r | Covariance ratio, a measure of change in the determinant of the coefficient covariance matrix. | 
| cook.d | Cook's distance. | 
| hat | Hat values. | 
| influential | Determines whether a case is influential on any of the
measures  | 
- is.infl is a data.frame indicating which influence measure(s)
is/are flagged per observation.
- vifs, a vector containing variance inflation factors for the
variables in the model.
By default, the two data.frames regarding influence measures only give the influence
measures for cases that are flagged as being influential. Influence measures for all cases
can be queried using print.check.lm.
The generated plots are the plots produced by plot.lm, numbers 1 through 6.
influential cases
For the influence indicators, the following rules are applied to check whether a case is influential:
-  \mathrm{any\enspace}|\mathrm{dfbeta}| > 1.
-  |\mathrm{dffit}| > 3 \sqrt{\frac{k}{n-k}}.
-  |1 - \mathrm{cov.r}| > \frac{3k}{n-k}.
-  F\mathrm{(}n, n-k \mathrm{)} = \mathrm{cooks.d\enspace having\enspace}. p > .5
-  \mathrm{hat} > \frac{3k}{n}.
These indicators for being an influential case were derived from
influence.measures in the stats package.
Author(s)
Mathijs Deen
Examples
lm.1 <- lm(mpg ~ disp + wt, data = mtcars)
check(lm.1)
Coefficients for logistic regression analysis
Description
Show odds ratios and their confidence intervals for logistic regression parameter estimates.
Usage
coefsLogReg(model, confint = TRUE, level = 0.95)
Arguments
| model | object of class  | 
| confint | indicates whether a confidence interval for the odds ratio should be returned. | 
| level | the confidence level required. | 
Value
coefsLogReg returns the same table as summary(object)$coefficients,
with the addition of the coefficients' odds ratios and their confidence intervals.
Author(s)
Mathijs Deen
Examples
glm(formula = am ~  disp, family = binomial, data = mtcars) |>
 coefsLogReg()
List of correlation coefficients
Description
List all correlations in a correlation matrix without duplicates.
Usage
corList(x, ...)
Arguments
| x | a numeric vector, matrix or data frame. | 
| ... | arguments passed to the  | 
Value
corList returns a list of correlations
Author(s)
Mathijs Deen
Examples
mtcars[,c("mpg","disp", "hp", "drat", "wt", "qsec")] |>
  corList(method="spearman")
Currency unicode character
Description
Retrieve Unicode character for a currency
Usage
currency2unicode(currency, type = c("character", "code"))
Arguments
| currency | character string or a vector of strings. Supported values are accounting sign, afghani, armenian dram, austral, baht, bitcoin, boliviano, cent, cedi, currency, dollar, dong, drachma, dutch guilder, euro, franc, georgian lari, german penny, hryvnia, indian rupee, iranian rial, kip, lari, lira, livre tournois, manat, mark, new shekel, pakistani rupee, peso, pound, quetzal, real, rial, ruble, shekel, spesmilo, syrian pound, tenge, tugrik, turkish lira, won, yen, yuan. | 
| type | indicate whether the Unicode  | 
Details
The input is evaluated case insensitive. In case the input is not supported, the function will return the original input.
Value
currency2unicode the unicode character for a given currency.
Author(s)
Mathijs Deen
Examples
currency2unicode("dollar")
cat(sprintf("%s5 is all my mom allows me to spend.", currency2unicode("dollar")))
Effect sizes from pretest-posttest-control group designs
Description
dPPC2 calculates an effect size for studies with
pretest and posttest scores for two groups, usually a treatment and
a control group. It is based on Morris (2008), who based it on Becker (1988).
Usage
dPPC2(preT, posT, preC, posC, correct = TRUE, CIlevel = 0.95)
Arguments
| preT | pre-scores for treatment group. | 
| posT | post-scores for treatment group. | 
| preC | pre-scores for control group. | 
| posC | post-scores for control group. | 
| correct | indicates whether a correction factor should be calculated (i.e., Hedges' g instead of Cohen's d). | 
| CIlevel | the confidence level required. | 
Value
dPPC2 returns a vector of length 6, containing:
| d | the effect size estimate. | 
| SE | the standard error of the effect sie estimate. | 
| lower.bound | lower bound of the confidence interval. | 
| upper.bound | upper bound of the confidence interval. | 
| NT | sample size of treatment group. | 
| NC | sample size of control group. | 
Author(s)
Mathijs Deen
References
- Becker, B.J. (1988). Synthesizing standardized mean-change measures. British Journal of Mathematical and Statistical Psychology, 41, 257-278. 
- Morris, S.B. (2008). Estimating effect sizes from pretest-posttest-control group designs. Organizational Research Methods, 11, 364-386. 
Examples
library(MASS)
set.seed(1)
treatment <- mvrnorm(n=50, mu=c(50,40), Sigma = matrix(c(100,70,70,100), ncol=2), empirical = TRUE)
control <- mvrnorm(n=50, mu=c(50,45), Sigma = matrix(c(100,70,70,100), ncol=2), empirical = TRUE)
dPPC2(treatment[,1], treatment[,2], control[,1], control[,2])
Local f^2
Description
Calculate local f^2 for (generalized) linear (mixed) models
Usage
f2Local(object, method, ...)
## S3 method for class 'lm'
f2Local(object, method = "r.squared", ...)
## S3 method for class 'glm'
f2Local(object, method = "r2", ...)
## S3 method for class 'vglm'
f2Local(object, method = "mcfadden", ...)
## S3 method for class 'glmmTMB'
f2Local(object, method = "nakagawa", type = "marginal", ...)
Arguments
| object | a model object (currently supported:  | 
| method | method for calculation of  | 
| ... | currently not used | 
| type | indicate whether the marginal (fixed effects only) or the conditional (fixed + random effects)
 | 
Details
The following methods can be specified:
-  lmobjects:r.squaredandadj.r.squaredas extracted from thelmobject.
-  glmobjects:mcfadden,nagelkerke,coxsnell,tjurandefron, as implemented in theperformancepackage.
-  vglmobjects:mcfadden,nagelkerke,coxsnell,tjurandefron, as implemented in theR2.vglmfunction.
-  glmmTMBobjects:nakagawa, as implemented in theperformancepackage. It can also be specified whether the marginal or the conditionalR^2should be used, however only the marginalR^2would make sense.
Note that for multinomial models, using method="efron" gives questionable with glm objects and
is not possible for vglm objects. For glm objects, method=coxsnell cannot be used when the
response is not binary.
Value
f2Local returns a list containing f^2 values for every parameter in a model. For the glmmTMB
class, a list of all reduced models is returned as well. In a future version, this will be available for other classes as well.
Methods (by class)
-  f2Local(lm): Method forlmobject
-  f2Local(glm): Method forglmobject
-  f2Local(vglm): Method forvglmobject
-  f2Local(glmmTMB): Method forglmmTMBobject
Author(s)
Mathijs Deen
Examples
# linear model
model1 <- lm(mpg ~ cyl + wt*drat, data = mtcars)
f2Local(model1)
# generalized linear model (glm)
model2 <- glm(vs ~  cyl*wt + mpg, data = mtcars, family = "binomial")
f2Local(model2, method = "coxsnell")
# generalized linear model (vglm)
if(require(VGAM)){
  pneumo <- transform(pneumo, let = log(exposure.time))
  model3 <- vglm(cbind(normal, mild, severe) ~ let, multinomial, pneumo)
  f2Local(model3)
}
# generalized linear mixed model
if(require(ClusterBootstrap) & require(glmmTMB)){
  model4 <- glmmTMB(pos ~ treat*time + (1 + time | id), data = medication)
  f2Local(model4)
}
Display frequency table
Description
Display frequency table with percentages and cumulative percentages.
Usage
frequencies(x)
Arguments
| x | vector of values. | 
Value
object of type data.frame containing frequencies, percentages and cumulative percentages.
Author(s)
Mathijs Deen
Examples
frequencies(datasets::mtcars$carb)
Gnomes mushroom insulation cost-effectiveness data
Description
The gnomes dataset consists of 300 observations of gnomes
that had their housing unit (i.e., their mushroom) insulated against cold and
humidity. The insulation was done by the most skilled insulation animals in
the forest: squirrels (Sciurus vulgaris).They either used the common insulation
technique consisting of leafs of the common beech tree (Fagus sylvatica) or
an experimental form of insulation using leafs of the less common (and thus,
more expensive) sessile oak tree (Quercus petraea). For the year before
insulation and the year after insulation, the gnomes filled out the Gnomes'
Humidity and Thermal Satisfaction scale (Gnomes' HATS),
a well-validated questionnaire that rates mushroom insulation satisfaction
w.r.t. humidity and temperature on a scale of 0 to 50. Differences between
pre and post measurement were calculated on a higher-is-better basis.
The squirrels were paid in acorns.
Usage
gnomes
Format
the following variables are available:
-  diffHATS: the difference in Gnomes' HATS scores between the year before and the year after insulation.
-  Costs: insulation costs in acorns.
-  insulationMethod: method of insulation, eithercommonBeechorsessileOak.
Author(s)
Mathijs Deen
Save something to an object
Description
keep saves an object to a new object. This is useful
if one wants to save an intermediate result when using pipes.
Usage
keep(object, name, pos = 1, envir = as.environment(pos), inherits = FALSE)
Arguments
| object | the object that is to be saved into  | 
| name | the name of the new object, containing the value of  | 
| pos | where to do the assignment. See  | 
| envir | the environment to use. See  | 
| inherits | should the enclosing framss of the environment be inspected?
See  | 
Value
Upon saving object to name, the value of object is
returned. This makes it suitable for pipes.
Author(s)
Mathijs Deen
Examples
mtcars |>
  lm(mpg ~  disp + hp, data = _) |>
  keep(lm.mpg_disp_hp) |>
  summary()
Mean center
Description
Mean center a vector or numeric matrix.
Usage
m(x)
Arguments
| x | a numeric matrix or vector. | 
Details
This function resembles base::scale.default, with the scale
argument set to FALSE. This, together with the short function name, is
especially useful when you want to mean center variables in an analysis (e.g.,
using (g)lm), but you dont want the long form scale(x, scale=FALSE)
to clutter up the rownames of the parameter estimates or the model anova.
Value
m returns a mean centered version of x. If x is
a matrix, the matrix dimensions are preserved.
Author(s)
Mathijs Deen
Examples
vals <- matrix(rnorm(24, 15, 10), ncol = 2)
m(vals)
Posterior model probability
Description
Calculate the posterior model probability for a set of models.
Usage
pMM(...)
Arguments
| ... | objects of class  | 
Details
Posterior model probabilities are calculated for every model i as 
\mathrm{pMO}_i = \frac{\mathrm{exp}\Big[-\frac{1}{2}\Delta_i\mathrm{BIC}\Big]}{\sum_{j = 1}^K\mathrm{exp}\Big[-\frac{1}{2}\Delta_j\mathrm{BIC}\Big]},
where the minimal BIC value is subtracted from all BICs. In other words: the model with the lowest BIC has \Delta\mathrm{BIC}=0.
Value
pMM returns to posterior model probabilities for the models provided.
Author(s)
Mathijs Deen
Examples
lm.1 <- lm(mpg ~ hp + wt, data = mtcars)
lm.2 <- lm(mpg ~ hp * wt, data = mtcars)
lm.3 <- lm(mpg ~ hp * wt + gear, data = mtcars)
pMM(lm.1, lm.2, lm.3)
Plot cost-effectiveness plane
Description
Plot cost-effectiveness plane
Usage
## S3 method for class 'CEA'
plot(
  x,
  xlim = c(-1, 1) * max(abs(x$stats$diffE)),
  ylim = c(-1, 1) * max(abs(x$stats$diffC)),
  xlab = "Incremental effects",
  ylab = sprintf("Incremental costs (%s)", x$currencyUC),
  las = 1,
  ...
)
Arguments
| x | object of class  | 
| xlim | limits of x axis (i.e., the axis of the incremental effects) | 
| ylim | limits of y axis (i.e., the axis of the incremental costs) | 
| xlab | label of x axis | 
| ylab | label of y axis | 
| las | style of the axis labels (see  | 
| ... | other arguments to be passed to the  | 
Value
plot.CEA returns a plot
Author(s)
Mathijs Deen
Examples
CEA(gnomes, insulationMethod, Costs, diffHATS, 5000, "acorns") |>
  plot()
Plot cost-effectiveness acceptability curve
Description
Plot cost-effectiveness acceptability curve
Usage
## S3 method for class 'CEAC'
plot(
  x,
  xlab = sprintf("Cost-effectiveness threshold (%s)", x$currencyUC),
  ylab = "Probability that intervention is cost-effective",
  las = 1,
  xlim = c(0, max(x$s$ICERs)),
  ...
)
Arguments
| x | object of class  | 
| xlab | label for x axis | 
| ylab | label for y axis | 
| las | style of the axis labels (see  | 
| xlim | limits of the x axis | 
| ... | other arguments to be passed to the  | 
Value
returns a plot
Author(s)
Mathijs Deen
Examples
CEA(gnomes, insulationMethod, Costs, diffHATS, 1000, "acorns") |>
  CEAC() |>
  plot(xlim = c(0,200))
plot probed interaction
Description
Plot the effects of the antecedent as a function of the moderator.
Usage
## S3 method for class 'probeInteraction'
plot(
  x,
  ...,
  col.JN = "red",
  lty.JN = "dotted",
  col.CI = rgb(red = 0.5, green = 0.5, blue = 0.5, alpha = 0.2),
  lty.CI = "longdash",
  lty.0 = "dotted"
)
Arguments
| x | object of class  | 
| ... | other arguments (none are used). | 
| col.JN | color for Johnson-Neyman cut-off line(s). | 
| lty.JN | linetype for Johnson-Neyman cut-off line(s). | 
| col.CI | color of the shade for the confidence interval. | 
| lty.CI | linetype for confidence interval boundaries. | 
| lty.0 | linetype for the horizontal line where the effect of the focal predictor on the outcome equals 0. | 
Value
plot.probeInteraction returns a combined plot with p value on the
first y axis and effect of the antecedent variable.
Author(s)
Mathijs Deen
Examples
lm.1 <- lm(mpg ~ hp * wt, data = mtcars)
pI.1 <- probeInteraction(lm.1, hp, wt, JN=TRUE, n.interval.moderator = 3,
                         quantile.moderator = c(0.1,0.9), values.moderator = 2)
plot(pI.1)
lm.2 <- lm(mpg ~ qsec * drat, data = mtcars)
pI.2 <- probeInteraction(lm.2, qsec, drat, JN=TRUE, n.interval.moderator = 30,
                         quantile.moderator = c(0.1,0.9), values.moderator = 2)
plot(pI.2)
plot roc curve
Description
Plot an ROC curve.
Usage
## S3 method for class 'roc'
plot(
  x,
  y,
  which = 1:3,
  orientation = c("horizontal", "vertical"),
  cutoffs.1 = NULL,
  cutoffs.2 = NULL,
  cutoffs.3 = NULL,
  xlab.3 = NULL,
  labels.3 = NULL,
  xlim.3 = NULL,
  ylim.3 = c(0, 10),
  pos.legend.2 = "right",
  pos.legend.3 = "topright",
  ...
)
Arguments
| x | object of class  | 
| y | argument for generic  | 
| which | which plots to show (see Details). | 
| orientation | indicate whether the plots should be arranged horizontally or vertically. | 
| cutoffs.1 | cutoff value(s) to be shown in the first plot. | 
| cutoffs.2 | cutoff value(s) to be shown in the second plot. | 
| cutoffs.3 | cutoff value(s) to be shown in the third plot. | 
| xlab.3 | lable for x axis in third plot. | 
| labels.3 | legend labels for third plot. | 
| xlim.3 | xlim for third plot. | 
| ylim.3 | ylim for third plot. | 
| pos.legend.2 | legend position for second plot. | 
| pos.legend.3 | legend position for third plot. | 
| ... | other arguments for generic  | 
Value
plot.roc provides three plots:
- The first plot contains the ROC curve. 
- The second plot contains curves for the sensitivity and the specificity for all threshold values. 
- The third plot contains density plots for the two classification groups. 
Author(s)
Mathijs Deen
Examples
a <- roc(QIDS$QIDS, QIDS$depression, c("Yes","No"), "Yes")
plot(a, ylim.3 = c(0,.2), xlab.3= "QIDS value", cutoffs.1 = 14.5,
     cutoffs.2 = 14.5, cutoffs.3 = 14.5)
Plot a probability distribution
Description
Plot the density function of certain probability distributions.
Usage
plotDistribution(
  distribution = c("normal", "t", "chi2", "F"),
  xRange = c(0, 5),
  xColArea = NULL,
  xAreaCol = NULL,
  mean = 0,
  sd = 1,
  df,
  df1,
  df2,
  ncp,
  ...
)
Arguments
| distribution | the probability distribution for which a plot should be drawn. Currently,
the options are  | 
| xRange | Range of x axis over which the distribution should be drawn. | 
| xColArea | Optional, a matrix with two columns, where each row contains lower and upper bounds for intervals that should be colored under the pdf curve. | 
| xAreaCol | Optional, should contain (a) color(s) for the interval colors in  | 
| mean | mean for the normal distribution. | 
| sd | sd for the normal distribution. | 
| df | df for the t distribution. | 
| df1 | first df for the F distribution. | 
| df2 | second df for the F distribution. | 
| ncp | non-centrality parameter | 
| ... | other arguments to be forwarded to the  | 
Value
plotDistribution returns a probability density plot.
Author(s)
Mathijs Deen
Examples
plotDistribution(distribution = "normal",
                 xRange       = c(-5, 5),
                 xColArea     = matrix(data  = c(-5, -1.96,
                                                 1.96, 5),
                                       ncol  = 2,
                                       byrow = TRUE),
                 xAreaCol     = c("green", "blue"),
                 mean         = 0,
                 sd           = 1,
                 yaxt         = "n",
                 ylab         = "")
Print lm check
Description
Print the check of lm object
Usage
## S3 method for class 'check.lm'
print(x, which.infl = c("influential", "all"), ...)
Arguments
| x | an object used to select a method. | 
| which.infl | Indicate whether only influential cases ( | 
| ... | further arguments passed to or from other methods (none are used). | 
Value
prints the check.lm object.
Author(s)
Mathijs Deen
Examples
lm.1 <- lm(mpg ~ disp + wt, data = mtcars)
chk.lm.1 <- check(lm.1)
print(chk.lm.1, which.infl="all")
Print effects of probed interaction
Description
Print the effects from a probed interaction.
Usage
## S3 method for class 'probeInteraction'
print(x, ...)
Arguments
| x | object of class  | 
| ... | other parameters (none are used). | 
Value
print.probeInteraction prints the effects table of a
probeInteraction object.
Author(s)
Mathijs Deen
Examples
lm.1 <- lm(mpg ~ hp * wt, data = mtcars)
pI <- probeInteraction(lm.1, hp, wt, JN=TRUE, n.interval.moderator = 3,
                       quantile.moderator = c(0.1,0.9), values.moderator = 2)
print(pI)
Print t test
Description
Print the output of a t test.
Usage
## S3 method for class 'tTest'
print(x, ...)
Arguments
| x | an object used to select a method. | 
| ... | further arguments passed to or from other methods. | 
Value
prints the tTest object as a htest object.
Author(s)
Mathijs Deen
Examples
x1 <- QIDS$QIDS[QIDS$depression == "Yes"]
x2 <- QIDS$QIDS[QIDS$depression == "No"]
tt <- tTest(x1, x2)
print(tt)
Print willingness to pay probe
Description
Print the outcome of a willingness to pay threshold probe.
Usage
## S3 method for class 'wtp'
print(x, ...)
Arguments
| x | object of class  | 
| ... | other arguments (none are used). | 
Value
print.wtp prints the outcome of wtp
Author(s)
Mathijs Deen
Examples
CEA(gnomes, insulationMethod, Costs, diffHATS, 1000, "acorns") |>
  CEAC() |>
  wtp(probability = 0.80)
CEA(gnomes, insulationMethod, Costs, diffHATS, 1000, "acorns") |>
  CEAC() |>
  wtp(threshold = 8)
Probe interaction models
Description
Probe the effect of a moderator on an X/antecedent variable in a linear model.
Usage
probeInteraction(
  object,
  antecedent,
  moderator,
  alpha = 0.05,
  JN = TRUE,
  n.interval.moderator,
  quantile.moderator,
  values.moderator
)
Arguments
| object | object of class  | 
| antecedent | antecedent (or x) variable in  | 
| moderator | moderator variable in  | 
| alpha | desired alpha level for Johnson-Neyman procedure. | 
| JN | indicate whether Johnson-Neyman procedure should be carried out. | 
| n.interval.moderator | number of intervals in the moderator variable to probe. | 
| quantile.moderator | quantile values in the moderator variable to probe. | 
| values.moderator | raw values in the moderator variable to probe. | 
Details
the arguments n.interval.moderator, quantile.moderator and values.moderator
can be combined. All unique values from these methods combined, together with the values from the
Johnson-Neyman procedure (if specified) will be part of the probing procedure.
Value
probeInteraction returns a data frame containing values of the moderator
in a linear model, the effect of the antecedent at that value of the moderator,
standard errors, t values, p values and a confidence interval.
Author(s)
Mathijs Deen
Examples
lm.1 <- lm(mpg ~ hp * wt, data = mtcars)
probeInteraction(lm.1, hp, wt, JN=TRUE, n.interval.moderator = 3,
                 quantile.moderator = c(0.1,0.9), values.moderator = 2)
Reliable change index
Description
rci computes the reliable change index according to Jacobson and Truax (1992).
Usage
rci(x1, x2, rxx)
Arguments
| x1 | prescore. | 
| x2 | postscore, same length as  | 
| rxx | internal consistency statistic. | 
Value
rci returns a vector of length(x1) with reliable change index scores.
Author(s)
Mathijs Deen
References
- Jacobson, N.S., & Truax, P. (1992). Clinical significance: a statistical approach to defining meaningful change in psychotherapy research. Journal of Consulting and Clinical Psychology, 59, 12-19. 
Examples
library(MASS)
set.seed(1)
q <- mvrnorm(n=120, mu=c(40, 50), Sigma = matrix(c(56.25,45,45,56.25), ncol = 2), empirical = TRUE)
cbind(q, rci(q[,1], q[,2], .8), rci(q[,1], q[,2], .8) > 1.96)
Receiver operator characteristic
Description
Calculate ROC curve statistics.
Usage
roc(response, group, levels, state)
Arguments
| response | response variable for which thresholds will be calculated. | 
| group | group variable. | 
| levels | relevant levels of  | 
| state | state level of  | 
Value
Returns a list with the following elements:
| data | 
 | 
| rdf | ROC dataframe. This is a  | 
| auc | Area under the ROC curve. | 
| response | Response variable from input data. | 
| group | Group variable from the input data. | 
| levels | Used levels. | 
| state | State level. | 
Author(s)
Mathijs Deen
Examples
roc(QIDS$QIDS, QIDS$depression, c("No","Yes"), "Yes") |>
  plot(ylim.3=c(0,.2))
Summarize outcome of a t test
Description
Summarize the outcome of a t test
Usage
## S3 method for class 'tTest'
summary(object, rnd = 3L, ...)
Arguments
| object | object of class  | 
| rnd | number of decimal places. Should have length 1 or 3. One value specifies the rounding value for the degrees of freedom, t statistic and p value all at once, while specifying three values gives the rounding values for the three statistics respectively. | 
| ... | other arguments of the summary generic (none are used). | 
Value
summary.htest returns a typical APA-like output (without italics) for a t-test.
Author(s)
Mathijs Deen
Examples
x1 <- QIDS$QIDS[QIDS$depression == "Yes"]
x2 <- QIDS$QIDS[QIDS$depression == "No"]
tt <- tTest(x1, x2)
summary(tt, rnd = c(1,2,3))
t Test
Description
perform t tests with the possibility of inputting group statistics.
Usage
tTest(
  x,
  y = NULL,
  sdx = NULL,
  sdy = NULL,
  nx = length(na.omit(x)),
  ny = length(na.omit(y)),
  alternative = c("two.sided", "greater", "less"),
  mu = 0,
  paired = FALSE,
  rxy = NULL,
  var.equal = FALSE,
  conf.level = 0.95
)
Arguments
| x | a numeric vector. Can be of length 1 for a group mean. | 
| y | a numeric vector. Should be  | 
| sdx | standard deviation for  | 
| sdy | standard deviation for  | 
| nx | sample size for  | 
| ny | sample size for  | 
| alternative | a character string specifying the alternative hypothesis,
must be one of " | 
| mu | a number indicating the true value of the mean (or difference in means) if you are performing an independent samples t-test). | 
| paired | a logical indicating whether you want a paired t-test. | 
| rxy | correlation between two paired samples. | 
| var.equal | a logical variable indicating whether to treat the two variances as being equal. If
 | 
| conf.level | level of the confidence interval. | 
Value
tTest performs a t-test (independent samples, paired samples, one sample) just like base-R t.test, but with the extended possibility to enter group statistics instead of raw data.
Author(s)
Mathijs Deen
Examples
library(MASS)
set.seed(1)
ds <- mvrnorm(n=50, mu = c(50,55),
              Sigma = matrix(c(100,0,0,81),
                             ncol = 2),
              empirical = TRUE) |>
  data.frame() |>
  setNames(c("x1","x2"))
t.test(ds$x1, ds$x2)
tTest(x   = ds$x1,
      y   = 55,
      sdy = 9,
      ny  = 50)
Probe willingness to pay
Description
Get the probability of being cost-effective given a certain cost-effectiveness threshold, and vice versa.
Usage
wtp(x, threshold = NULL, probability = NULL)
Arguments
| x | object of class  | 
| threshold | cost-effectiveness threshold | 
| probability | probability of being cost-effective | 
Details
One of the two parameters threshold and probability
should be specified.
Value
wtp either the probability or the threshold. If there is no exact match
to the given parameter in the bootstrap samples, the result is interpolated.
Author(s)
Mathijs Deen
Examples
CEA(gnomes, insulationMethod, Costs, diffHATS, 1000, "acorns") |>
  CEAC() |>
  wtp(probability = 0.80)
CEA(gnomes, insulationMethod, Costs, diffHATS, 1000, "acorns") |>
  CEAC() |>
  wtp(threshold = 8)