Skip to content

Commit

Permalink
Update wrappers
Browse files Browse the repository at this point in the history
  • Loading branch information
boutinb committed Nov 5, 2024
1 parent 3e06eca commit 9c710a6
Show file tree
Hide file tree
Showing 11 changed files with 52 additions and 52 deletions.
12 changes: 6 additions & 6 deletions R/InformedBinomialTestBayesianWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,15 +19,15 @@

InformedBinomialTestBayesian <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
bayesFactorType = "BF10",
bfComparison = "encompassing",
bfVsHypothesis = "Model 1",
bridgeSamples = 1000,
descriptivesDisplay = "counts",
descriptivesPlot = FALSE,
descriptivesTable = FALSE,
factor = "",
factor = list(types = list(), value = ""),
includeEncompassingModel = TRUE,
includeNullModel = TRUE,
mcmcBurnin = 500,
Expand All @@ -38,14 +38,14 @@ InformedBinomialTestBayesian <- function(
posteriorPlot = FALSE,
posteriorPlotCiCoverage = 0.95,
priorCounts = list(list(levels = list(), name = "data 1", values = list()), list(levels = list(), name = "data 2", values = list())),
priorModelProbability = list(list(levels = list("Model 1", "Encompassing", "Null"), name = "data 1", values = list(1, 1, 1))),
sampleSize = "",
priorModelProbability = list(list(levels = list(), name = "data 1", values = list())),
sampleSize = list(types = list(), value = ""),
seed = 1,
sequentialAnalysisNumberOfSteps = 10,
sequentialAnalysisPlot = FALSE,
sequentialAnalysisPlotType = "bayesFactor",
setSeed = FALSE,
successes = "") {
successes = list(types = list(), value = "")) {

defaultArgCalls <- formals(jaspFrequencies::InformedBinomialTestBayesian)
defaultArgs <- lapply(defaultArgCalls, eval)
Expand Down
8 changes: 4 additions & 4 deletions R/InformedMultinomialTestBayesianWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,16 +19,16 @@

InformedMultinomialTestBayesian <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
bayesFactorType = "BF10",
bfComparison = "null",
bfVsHypothesis = "Model 1",
bridgeSamples = 10000,
count = "",
count = list(types = list(), value = ""),
descriptivesDisplay = "counts",
descriptivesPlot = FALSE,
descriptivesTable = FALSE,
factor = "",
factor = list(types = list(), value = ""),
includeEncompassingModel = TRUE,
includeNullModel = TRUE,
mcmcBurnin = 500,
Expand Down
12 changes: 6 additions & 6 deletions R/abtestbayesianWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,7 +19,7 @@

ABTestBayesian <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
bayesFactorOrder = "bestModelTop",
bayesFactorType = "BF10",
bfRobustnessPlot = FALSE,
Expand All @@ -32,8 +32,8 @@ ABTestBayesian <- function(
bfRobustnessPlotUpperPriorSd = 1,
bfSequentialPlot = FALSE,
descriptivesTable = FALSE,
n1 = "",
n2 = "",
n1 = list(types = list(), value = ""),
n2 = list(types = list(), value = ""),
normalPriorMean = 0,
normalPriorSd = 1,
plotHeight = 320,
Expand All @@ -49,8 +49,8 @@ ABTestBayesian <- function(
samples = 10000,
seed = 1,
setSeed = FALSE,
y1 = "",
y2 = "") {
y1 = list(types = list(), value = ""),
y2 = list(types = list(), value = "")) {

defaultArgCalls <- formals(jaspFrequencies::ABTestBayesian)
defaultArgs <- lapply(defaultArgCalls, eval)
Expand Down
6 changes: 3 additions & 3 deletions R/binomialtestWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,7 +19,7 @@

BinomialTest <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
formula = NULL,
alternative = "twoSided",
ci = FALSE,
Expand All @@ -29,7 +29,7 @@ BinomialTest <- function(
plotHeight = 320,
plotWidth = 480,
testValue = "0.5",
variables = list(),
variables = list(types = list(), value = NULL),
vovkSellke = FALSE) {

defaultArgCalls <- formals(jaspFrequencies::BinomialTest)
Expand Down
6 changes: 3 additions & 3 deletions R/binomialtestbayesianWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,7 +19,7 @@

BinomialTestBayesian <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
formula = NULL,
alternative = "twoSided",
bayesFactorType = "BF10",
Expand All @@ -33,7 +33,7 @@ BinomialTestBayesian <- function(
priorPosteriorPlot = FALSE,
priorPosteriorPlotAdditionalInfo = TRUE,
testValue = "0.5",
variables = list()) {
variables = list(types = list(), value = NULL)) {

defaultArgCalls <- formals(jaspFrequencies::BinomialTestBayesian)
defaultArgs <- lapply(defaultArgCalls, eval)
Expand Down
10 changes: 5 additions & 5 deletions R/contingencytablesWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,16 +19,16 @@

ContingencyTables <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
formula = NULL,
byIntervalEta = FALSE,
chiSquared = TRUE,
chiSquaredContinuityCorrection = FALSE,
cochranAndMantel = FALSE,
columnOrder = "ascending",
columns = list(),
columns = list(types = list(), value = NULL),
contingencyCoefficient = FALSE,
counts = "",
counts = list(types = list(), value = ""),
countsExpected = FALSE,
countsHiddenSmallCounts = FALSE,
countsHiddenSmallCountsThreshold = 5,
Expand All @@ -52,7 +52,7 @@ ContingencyTables <- function(
residualsStandardized = FALSE,
residualsUnstandardized = FALSE,
rowOrder = "ascending",
rows = list(),
rows = list(types = list(), value = NULL),
somersD = FALSE,
testOddsRatioEquals = 1,
uncertaintyCoefficient = FALSE,
Expand Down
10 changes: 5 additions & 5 deletions R/contingencytablesbayesianWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,13 +19,13 @@

ContingencyTablesBayesian <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
formula = NULL,
alternative = "twoSided",
bayesFactorType = "BF10",
columnOrder = "ascending",
columns = list(),
counts = "",
columns = list(types = list(), value = NULL),
counts = list(types = list(), value = ""),
countsExpected = FALSE,
cramersV = FALSE,
cramersVCiLevel = 0.95,
Expand All @@ -45,7 +45,7 @@ ContingencyTablesBayesian <- function(
residualsStandardized = FALSE,
residualsUnstandardized = FALSE,
rowOrder = "ascending",
rows = list(),
rows = list(types = list(), value = NULL),
samplingModel = "independentMultinomialRowsFixed",
seed = 1,
setSeed = FALSE) {
Expand Down
10 changes: 5 additions & 5 deletions R/multinomialtestWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,16 +19,16 @@

MultinomialTest <- function(
data = NULL,
version = "0.19",
count = "",
version = "0.19.2",
count = list(types = list(), value = ""),
descriptivesPlot = FALSE,
descriptivesPlotCiLevel = 0.95,
descriptivesTable = FALSE,
descriptivesTableCi = FALSE,
descriptivesTableCiLevel = 0.95,
descriptivesType = "counts",
expectedCount = "",
factor = "",
expectedCount = list(types = list(), value = ""),
factor = list(types = list(), value = ""),
plotHeight = 320,
plotWidth = 480,
testValues = "equal",
Expand Down
10 changes: 5 additions & 5 deletions R/multinomialtestbayesianWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,17 +19,17 @@

MultinomialTestBayesian <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
bayesFactorType = "BF10",
count = "",
count = list(types = list(), value = ""),
descriptivesPlot = FALSE,
descriptivesPlotCiLevel = 0.95,
descriptivesTable = FALSE,
descriptivesTableCi = FALSE,
descriptivesTableCiLevel = 0.95,
descriptivesType = "counts",
expectedCount = "",
factor = "",
expectedCount = list(types = list(), value = ""),
factor = list(types = list(), value = ""),
plotHeight = 320,
plotWidth = 480,
priorCounts = list(list(levels = list(), name = "data 1", values = list())),
Expand Down
10 changes: 5 additions & 5 deletions R/regressionloglinearWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,11 +19,11 @@

RegressionLogLinear <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
formula = NULL,
count = "",
factors = list(),
modelTerms = list(),
count = list(types = list(), value = ""),
factors = list(types = list(), value = NULL),
modelTerms = list(optionKey = "components", types = list(), value = list()),
plotHeight = 320,
plotWidth = 480,
regressionCoefficientsCi = FALSE,
Expand Down
10 changes: 5 additions & 5 deletions R/regressionloglinearbayesianWrapper.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
#
# Copyright (C) 2013-2022 University of Amsterdam
# Copyright (C) 2013-2024 University of Amsterdam
#
# This program is free software: you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
Expand All @@ -19,14 +19,14 @@

RegressionLogLinearBayesian <- function(
data = NULL,
version = "0.19",
version = "0.19.2",
formula = NULL,
bayesFactorType = "BF10",
count = "",
factors = list(),
count = list(types = list(), value = ""),
factors = list(types = list(), value = NULL),
modelCutOffBestDisplayed = 2,
modelCutOffPosteriorProbability = 0.1,
modelTerms = list(),
modelTerms = list(optionKey = "components", types = list(), value = list()),
plotHeight = 320,
plotWidth = 480,
priorScale = 0,
Expand Down

0 comments on commit 9c710a6

Please sign in to comment.