# Tests "bca" function
context("define a bca")
library(dst)
test_that("bcaspec_1", {
# T1: length(tt[1,]) != length(cnames)
tt<- t(matrix(c(1,0,1,1),ncol=2))
m<- c(.9,.1)
cnames <- c("yes","no")
expect_error(bca(tt, m, cnames = c("a") ) ,"Error in input arguments: Duplicate names in column names of tt matrix or in column names supplied.")
#
# T2: length(tt[,1])! = length(m)
tt<- t(matrix(c(1,0,1,1),ncol=2))
m = c(0.1, 0.2, 0.7)
cnames <- c("yes","no")
expect_error(bca(tt, m = c(0.1, 0.2, 0.7), cnames ) , "Error in input arguments: check your input data.")
#
# T3: abs(sum(m)-1) > 0.000001
tt<- t(matrix(c(1,0,1,1),ncol=2))
m = c(0.3, 0.8)
cnames <- c("yes","no")
expect_error(bca(tt, m = c(0.3, 0.8), cnames ) , "Error in input arguments: check your input data.")
#
# T4: Result is of class "bcaspec"
# nb of value names == nb of columns of truth table matrix
tt<- t(matrix(c(1,0,1,1),ncol=2))
m<- c(.9,.1)
cnames <- c("yes","no")
result <- bca(tt, m)
expect_is(result, "bcaspec")
expect_equal(length(result$valuenames$v1), ncol(result$tt)) # length of value names vector match with input table
#
# T5: More variable names than needed
tt<- t(matrix(c(1,0,1,1),ncol=2))
m = c(0.3, 0.7)
cnames <- c("yes","no")
expect_error(bca(tt, m, cnames, varnames = c("burglary", "boom") ), "number of variable names not equal to number of variables" )
#
# T6: take names from "valuenames" parameter only if it is a string. If the matrix f is defined on a product space, the names must be the column names of the matrix.
tt1=matrix(c(rep(TRUE,3),FALSE, rep(TRUE,4)), ncol=4, byrow=TRUE)
m=c(0.75, 0.25)
infovar=matrix(c(4,5,2,2), ncol=2, dimnames =list(NULL, c("varnb", "size")))
varnames = c("RdWorks", "Rain")
valuenames <- list(Rain= c("Ry", "Rn"), RdWorks=c("rWdy", "rWdn") )
result <- bca(tt = tt1, m, infovar = infovar, varnames = varnames, valuenames = valuenames)
expect_equal(colnames(result$tt), c("col1", "col2", "col3", "col4"))
#
# T7: take names from "valuenames" parameter only if it is a string. If the matrix f is defined on a product space, the names must be the column names of the matrix.
tt1=matrix(c(rep(TRUE,3),FALSE, rep(TRUE,4)), ncol=4, byrow=TRUE)
m=c(0.75, 0.25)
cnames <- c("rWdy Ry", "rWdy Rn", "rWdn Ry", "rWdn Rn")
infovar=matrix(c(4,5,2,2), ncol=2, dimnames =list(NULL, c("varnb", "size")))
varnames = c("RdWorks", "Rain")
valuenames <- list(Rain= c("Ry", "Rn"), RdWorks=c("rWdy", "rWdn") )
result <- bca(tt = tt1, m = m, cnames = cnames, infovar = infovar, varnames = varnames, valuenames = valuenames)
expect_equal(colnames(result$tt), c("rWdy Ry", "rWdy Rn", "rWdn Ry", "rWdn Rn"))
#
# T8 tt matrix mising
expect_error(bca(m = c(0.2,0.5, 0.3), varnames = "x", idvar = 1), "Error in input arguments: description matrix tt is missing.")
#
# T9 Names of variables must start with a letter
expect_error(bca(tt=matrix(c(0,1,1), nrow = 1, byrow = TRUE), m = c(1), cnames = c("a", "b", "c"), idvar = 2, varnames = 1 ) )
#
})
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.