Nothing
# Version: 03-07-2013, DF
# Changes:
# 03-07-2013: Added the keepPM option
mw.single.gmw <- function(X,g,goi,type,nper,alternative,mc,PARAMETERS,output, keepPM){
res <- list()
diffTests <- getComb(goi,"single",order=T)
METHOD <- c("********* Mann-Whitney Test (single) *********")
DNAME <- PARAMETERS[[1]]
TEST <- PARAMETERS[[2]]
TYPE <- PARAMETERS[[3]]
ALTERNATIVE <- PARAMETERS[[4]]
STATISTIC <- PARAMETERS[[5]]
PVAL <- PARAMETERS[[6]]
dimX <- PARAMETERS[[7]]
XisVector <- PARAMETERS[[8]]
## Case: X is vector
if(XisVector){
##---------------------------------------------------------------------------------------------------------------------------------------
if(alternative=="two.sided"){
if(type=="permutation"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: permutation, two sided, X is vector
for(testRun in 1:nrow(diffTests))
{
obsValue <- oneVsOther(X,g,diffTests[testRun,1],goi)
nullDist <- mwSingleNullDist(X,g,diffTests[testRun,1],goi,nper)
PVAL <- 2*min(sum(nullDist>=obsValue)/nper,sum(nullDist<obsValue)/nper)
names(PVAL) <- "p.value"
STATISTIC <- obsValue
names(STATISTIC) <- "obs.value"
ALTERNATIVE <- "two.sided"
resTemp<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp)<-"htest"
res[[testRun]] <- resTemp
#names(res)[testRun] <- paste("P",diffTests[testRun,1],":",paste(diffTests[testRun,-1],collapse=""),sep="")
#names(res)[testRun] <- paste("H1: (max and min)(P_t",diffTests[testRun,1],",P_t'",diffTests[testRun,1],") !=1/2 , t<t'",sep="")
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," != ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=1,nrow=length(res))
colnames(resMin) <- "pValues"
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
resMin[i,1] <- res[[i]]$p.value
}
res <- resMin
}
} else if(type=="asymptotic"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: asymptotic, two sided, X is vector
res <- c()
stop("We do not have an asymptotic two-sided version for the MW test, sorry!")
} else if(type=="external"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: MW from the base system, two.sided, X is vector
for(testRun in 1:nrow(diffTests))
{ # Our greater and base greater are different interpretations, remeber that!!!
testResult <- wilcox.test(X[g==diffTests[testRun,1]],X[g!=diffTests[testRun,1]],alt="two.sided")
PVAL <- testResult$p.value
names(PVAL) <- "p.value"
STATISTIC <- testResult$statistic
names(STATISTIC) <- "obs.value"
ALTERNATIVE <- "two.sided"
resTemp<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp)<-"htest"
res[[testRun]] <- resTemp
#names(res)[testRun] <- paste("P",diffTests[testRun,1],":",paste(diffTests[testRun,-1],collapse=""),sep="")
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," != ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=1,nrow=length(res))
colnames(resMin) <- "pValues"
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
resMin[i,1] <- res[[i]]$p.value
}
res <- resMin
}
} else {
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: other options, two sided, X is vector
res <- c()
stop("We do not have this kind of type for the MW test!")
}
##---------------------------------------------------------------------------------------------------------------------------------------
} else if(alternative=="greater"){
if(type=="permutation"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: permutation, greater, X is vector
for(testRun in 1:nrow(diffTests))
{
obsValue <- oneVsOther(X,g,diffTests[testRun,1],goi)
nullDist <- mwSingleNullDist(X,g,diffTests[testRun,1],goi,nper)
PVAL <- sum(nullDist>=obsValue)/nper
names(PVAL) <- "p.value"
STATISTIC <- obsValue
names(STATISTIC) <- "obs.value"
ALTERNATIVE <- "greater"
resTemp<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp)<-"htest"
res[[testRun]] <- resTemp
#names(res)[testRun] <- paste("P",diffTests[testRun,1],":",paste(diffTests[testRun,-1],collapse=""),sep="")
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," < ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=1,nrow=length(res))
colnames(resMin) <- "pValues"
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
resMin[i,1] <- res[[i]]$p.value
}
res <- resMin
}
} else if(type=="asymptotic"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: asymptotic, greater, X is vector
res <- c()
stop("We do not have an asymptotic greater version for the MW test, sorry!")
} else if(type=="external"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: MW from the base system, greater, X is vector
for(testRun in 1:nrow(diffTests))
{ # Our greater and base greater are different interpretations, remember that!!!
testResult <- wilcox.test(X[g==diffTests[testRun,1]],X[g!=diffTests[testRun,1]],alt="less")
PVAL <- testResult$p.value
names(PVAL) <- "p.value"
STATISTIC <- testResult$statistic
names(STATISTIC) <- "obs.value"
ALTERNATIVE <- "greater"
resTemp<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp)<-"htest"
res[[testRun]] <- resTemp
#names(res)[testRun] <- paste("P",diffTests[testRun,1],":",paste(diffTests[testRun,-1],collapse=""),sep="")
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," < ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=1,nrow=length(res))
colnames(resMin) <- "pValues"
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
resMin[i,1] <- res[[i]]$p.value
}
res <- resMin
}
} else {
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: other options, greater, X is vector
res <- c()
stop("We do not have this kind of type for the MW test!")
}
} else if(alternative=="smaller"){
##---------------------------------------------------------------------------------------------------------------------------------------
if(type=="permutation"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: permutation, smaller, X is vector
for(testRun in 1:nrow(diffTests))
{
obsValue <- oneVsOther(X,g,diffTests[testRun,1],goi)
nullDist <- mwSingleNullDist(X,g,diffTests[testRun,1],goi,nper)
PVAL <- sum(nullDist<obsValue)/nper
names(PVAL) <- "p.value"
STATISTIC <- obsValue
names(STATISTIC) <- "obs.value"
ALTERNATIVE <- "greater"
resTemp<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp)<-"htest"
res[[testRun]] <- resTemp
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," > ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=1,nrow=length(res))
colnames(resMin) <- "pValues"
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
resMin[i,1] <- res[[i]]$p.value
}
res <- resMin
}
} else if(type=="asymptotic"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: asymptotic, smaller, X is vector
res <- c()
stop("We do not have an asymptotic smaller version for the MW test, sorry!")
} else if(type=="external"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: MW from the base system, smaller, X is vector
for(testRun in 1:nrow(diffTests))
{ # Our greater and base greater are different interpretations, remeber that!!!
testResult <- wilcox.test(X[g==diffTests[testRun,1]],X[g!=diffTests[testRun,1]],alt="greater")
PVAL <- testResult$p.value
names(PVAL) <- "p.value"
STATISTIC <- testResult$statistic
names(STATISTIC) <- "obs.value"
ALTERNATIVE <- "smaller"
resTemp<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp)<-"htest"
res[[testRun]] <- resTemp
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," > ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=1,nrow=length(res))
colnames(resMin) <- "pValues"
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
resMin[i,1] <- res[[i]]$p.value
}
res <- resMin
}
} else {
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: other options, one sided, X is vector
res <- c()
stop("We do not have this kind of type for the MW test!")
}
} else {
res <- c()
stop("There is no other option than small, greater or two-sided...")
}
## Case: X is a matrix
} else{
##----------------------------------------------------------------------------------------------------------------------------------------
#Preparational things for the case that X is a matrix
# First, restrict the cores to maximum of possible tests
if(mc>detectCores()){
mc <- detectCores()
warning("You do not have so many cores on this machine! I automatically reduced it to your maximum number ",mc)
}
mc <- min(dimX[2],mc)
if(alternative=="two.sided"){
if(type=="permutation"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: permutation, two sided, X is matrix
innerLoop <- function(i,testRun){
nullDist <- mwSingleNullDist(X[,i],g,diffTests[testRun,1],goi,nper)
obsValue <- oneVsOther(X[,i],g,diffTests[testRun,1],goi)
pValue <- 2*min(sum(nullDist>=obsValue)/nper,sum(nullDist<obsValue)/nper)
return(list(pValue=pValue,obsValue=obsValue))
}
innerLoopPM <- function(i,testRun){
nullDist <- mwSingleNullDist(X[,i],g,diffTests[testRun,1],goi,nper)
obsValue <- oneVsOther(X[,i],g,diffTests[testRun,1],goi)
pValue <- 2*min(sum(nullDist>=obsValue)/nper,sum(nullDist<obsValue)/nper)
return(list(pValue=pValue,obsValue=obsValue, nullDist=nullDist))
}
if(keepPM){
nullDistRES <- list()
STATISTIC <- list()
for(i in 1:nrow(diffTests)){
nullDistRES[[i]] <- matrix(0, ncol=dimX[2],nrow=nper)
STATISTIC[[i]] <- c(rep(-1,dimX[2]))
}
}
for(testRun in 1:nrow(diffTests))
{
resTemp <- list()
if(keepPM==TRUE){
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoopPM,testRun=testRun,mc.cores=mc))
#nullDistRES <- matrix(0, ncol=dimX[2],nrow=nper)
} else {
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoop,testRun=testRun,mc.cores=mc))
}
for(i in 1:dimX[2])
{
if(keepPM==TRUE){
PVAL <- resInner[nper*(i-1) + 2*(i) - 1]
STATISTIC[[testRun]][i] <- resInner[nper*(i-1) + 2*i]
nullDistRES[[testRun]][,i] <- resInner[(nper*(i-1) + 2*i + 1):(nper*i + 2*i)]
} else {
PVAL <- resInner[2*i-1]
STATISTIC <- resInner[2*i]
}
obsValue <- STATISTIC
names(PVAL) <- "p.value"
ALTERNATIVE <- "greater"
names(STATISTIC) <- "obs.value"
resTemp[[i]]<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp[[i]])<-"htest"
}
res[[testRun]] <- resTemp
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," != ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=dimX[2],nrow=length(res))
colnames(resMin) <- colnames(X)
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
for(j in 1:dimX[2])
{
resMin[i,j] <- res[[i]][[j]]$p.value
}
}
res <- resMin
}
} else if(type=="asymptotic"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: asymptotic, two sided, X is matrix
res <- c()
stop("We do not have an asymptotic two-sided version for the MW test, sorry!")
} else if(type=="external"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: permutation, two sided, X is matrix
innerLoop <- function(i,testRun){
testResult <- wilcox.test(X[g==diffTests[testRun,1],i],X[g!=diffTests[testRun,1],i],alt="two.sided")
obsValue <- testResult$statistic
pValue <- testResult$p.value
return(list(pValue=pValue,obsValue=obsValue))
}
for(testRun in 1:nrow(diffTests))
{
resTemp <- list()
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoop,testRun=testRun,mc.cores=mc))
for(i in 1:dimX[2])
{
PVAL <- resInner[2*i-1]
STATISTIC <- resInner[2*i]
names(PVAL) <- "p.value"
ALTERNATIVE <- "two.sided"
names(STATISTIC) <- "obs.value"
resTemp[[i]]<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp[[i]])<-"htest"
}
res[[testRun]] <- resTemp
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," != ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=dimX[2],nrow=length(res))
colnames(resMin) <- colnames(X)
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
for(j in 1:dimX[2])
{
resMin[i,j] <- res[[i]][[j]]$p.value
}
}
res <- resMin
}
} else {
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: other options, two sided, X is matrix
res <- c()
stop("We do not have this kind of type for the MW test!")
}
} else if(alternative=="greater"){
if(type=="permutation"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: permutation, greater, X is matrix
# Define the function, that is performed for column i (important for parallelization)
innerLoop <- function(i,testRun){
nullDist <- mwSingleNullDist(X[,i],g,diffTests[testRun,1],goi,nper)
obsValue <- oneVsOther(X[,i],g,diffTests[testRun,1],goi)
pValue <- sum(nullDist>=obsValue)/nper
return(list(pValue=pValue,obsValue=obsValue))
}
innerLoopPM <- function(i,testRun){
nullDist <- mwSingleNullDist(X[,i],g,diffTests[testRun,1],goi,nper)
obsValue <- oneVsOther(X[,i],g,diffTests[testRun,1],goi)
pValue <- sum(nullDist>=obsValue)/nper
return(list(pValue=pValue,obsValue=obsValue, nullDist=nullDist))
}
if(keepPM){
nullDistRES <- list()
STATISTIC <- list()
for(i in 1:nrow(diffTests)){
nullDistRES[[i]] <- matrix(0, ncol=dimX[2],nrow=nper)
STATISTIC[[i]] <- c(rep(-1,dimX[2]))
}
}
for(testRun in 1:nrow(diffTests))
{
resTemp <- list()
if(keepPM==TRUE){
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoopPM,testRun=testRun,mc.cores=mc))
#nullDistRES <- matrix(0, ncol=dimX[2],nrow=nper)
} else {
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoop,testRun=testRun,mc.cores=mc))
}
for(i in 1:dimX[2])
{
if(keepPM==TRUE){
PVAL <- resInner[nper*(i-1) + 2*(i) - 1]
STATISTIC[[testRun]][i] <- resInner[nper*(i-1) + 2*i]
nullDistRES[[testRun]][,i] <- resInner[(nper*(i-1) + 2*i + 1):(nper*i + 2*i)]
} else {
PVAL <- resInner[2*i-1]
STATISTIC <- resInner[2*i]
}
obsValue <- STATISTIC
names(PVAL) <- "p.value"
ALTERNATIVE <- "greater"
names(STATISTIC) <- "obs.value"
resTemp[[i]]<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp[[i]])<-"htest"
}
res[[testRun]] <- resTemp
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," < ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=dimX[2],nrow=length(res))
colnames(resMin) <- colnames(X)
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
for(j in 1:dimX[2])
{
resMin[i,j] <- res[[i]][[j]]$p.value
}
}
res <- resMin
}
} else if(type=="asymptotic"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: asymptotic, greater, X is matrix
res <- c()
stop("We do not have an asymptotic greater version for the MW test, sorry!")
} else if(type=="external"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: base, greater, X is matrix
innerLoop <- function(i,testRun){
testResult <- wilcox.test(X[g==diffTests[testRun,1],i],X[g!=diffTests[testRun,1],i],alt="less")
obsValue <- testResult$statistic
pValue <- testResult$p.value
return(list(pValue=pValue,obsValue=obsValue))
}
for(testRun in 1:nrow(diffTests))
{
resTemp <- list()
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoop,testRun=testRun,mc.cores=mc))
for(i in 1:dimX[2])
{
PVAL <- resInner[2*i-1]
STATISTIC <- resInner[2*i]
names(PVAL) <- "p.value"
ALTERNATIVE <- "greater"
names(STATISTIC) <- "obs.value"
resTemp[[i]]<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp[[i]])<-"htest"
}
res[[testRun]] <- resTemp
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," < ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=dimX[2],nrow=length(res))
colnames(resMin) <- colnames(X)
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
for(j in 1:dimX[2])
{
resMin[i,j] <- res[[i]][[j]]$p.value
}
}
res <- resMin
}
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: other, greater, X is matrix
} else {
res <- c()
stop("We do not have this kind of type for the MWT!")
}
} else if(alternative=="smaller"){
if(type=="permutation"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: permutation, smaller, X is matrix
# Define the function, that is performed for column i (important for parallelization)
innerLoop <- function(i,testRun){
nullDist <- mwSingleNullDist(X[,i],g,diffTests[testRun,1],goi,nper)
obsValue <- oneVsOther(X[,i],g,diffTests[testRun,1],goi)
pValue <- sum(nullDist<obsValue)/nper
return(list(pValue=pValue,obsValue=obsValue))
}
innerLoopPM <- function(i,testRun){
nullDist <- mwSingleNullDist(X[,i],g,diffTests[testRun,1],goi,nper)
obsValue <- oneVsOther(X[,i],g,diffTests[testRun,1],goi)
pValue <- sum(nullDist<obsValue)/nper
return(list(pValue=pValue,obsValue=obsValue, nulldist=nullDist))
}
if(keepPM){
nullDistRES <- list()
STATISTIC <- list()
for(i in 1:nrow(diffTests)){
nullDistRES[[i]] <- matrix(0, ncol=dimX[2],nrow=nper)
STATISTIC[[i]] <- c(rep(-1,dimX[2]))
}
}
for(testRun in 1:nrow(diffTests))
{
resTemp <- list()
if(keepPM==TRUE){
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoopPM,testRun=testRun,mc.cores=mc))
#nullDistRES <- matrix(0, ncol=dimX[2],nrow=nper)
} else {
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoop,testRun=testRun,mc.cores=mc))
}
for(i in 1:dimX[2])
{
if(keepPM==TRUE){
PVAL <- resInner[nper*(i-1) + 2*(i) - 1]
STATISTIC[[testRun]][i] <- resInner[nper*(i-1) + 2*i]
nullDistRES[[testRun]][,i] <- resInner[(nper*(i-1) + 2*i + 1):(nper*i + 2*i)]
} else {
PVAL <- resInner[2*i-1]
STATISTIC <- resInner[2*i]
}
obsValue <- STATISTIC
names(PVAL) <- "p.value"
ALTERNATIVE <- "smaller"
names(STATISTIC) <- "obs.value"
resTemp[[i]]<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp[[i]])<-"htest"
}
res[[testRun]] <- resTemp
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," > ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=dimX[2],nrow=length(res))
colnames(resMin) <- colnames(X)
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
for(j in 1:dimX[2])
{
resMin[i,j] <- res[[i]][[j]]$p.value
}
}
res <- resMin
}
} else if(type=="asymptotic"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: asymptotic, smaller, X is matrix
res <- c()
stop("We do not have this kind of type for the MW test!")
} else if(type=="external"){
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: base, smaller, X is matrix
innerLoop <- function(i,testRun){
testResult <- wilcox.test(X[g==diffTests[testRun,1],i],X[g!=diffTests[testRun,1],i],alt="greater")
obsValue <- testResult$statistic
pValue <- testResult$p.value
return(list(pValue=pValue,obsValue=obsValue))
}
for(testRun in 1:nrow(diffTests))
{
resTemp <- list()
resInner <- unlist(mclapply(c(1:dimX[2]),innerLoop,testRun=testRun,mc.cores=mc))
for(i in 1:dimX[2])
{
PVAL <- resInner[2*i-1]
STATISTIC <- resInner[2*i]
names(PVAL) <- "p.value"
ALTERNATIVE <- "smaller"
names(STATISTIC) <- "obs.value"
resTemp[[i]]<-c(list(method=METHOD,data.name=DNAME,alternative=ALTERNATIVE,statistic=STATISTIC,test=TEST,p.value=PVAL,type=TYPE))
class(resTemp[[i]])<-"htest"
}
res[[testRun]] <- resTemp
names(res)[testRun] <- paste("H1: ",diffTests[testRun,1]," > ",paste(diffTests[testRun,-1],collapse=","),sep="")
}
if(output=="min")
{
resMin <- matrix(NA,ncol=dimX[2],nrow=length(res))
colnames(resMin) <- colnames(X)
rownames(resMin) <- names(res)
for(i in 1:length(res))
{
for(j in 1:dimX[2])
{
resMin[i,j] <- res[[i]][[j]]$p.value
}
}
res <- resMin
}
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: other, smaller, X is matrix
} else {
res <- c()
stop("We do not have this kind of type for the MW test!")
}
#----------------------------------------------------------------------------------------------------------------------------------------
# Case: other, other, X is matrix
} else {
res <- c()
stop("There are no other alternatives possible, sorry!")
}
}
if(type=="permutation"){
ifelse(keepPM,res <- list(p.values=res, nullDist=nullDistRES, obsValue=obsValue), res <- list(p.values=res))
} else {
res <- list(p.values=res)
}
res
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.