view runit/checkformat_runtests.R @ 3:80a38d36f946 draft

planemo upload for repository https://github.com/workflow4metabolomics/checkformat.git commit 5cf3f6eb62c1396ade1b068a3dd3cc2e3f827e15
author ethevenot
date Thu, 11 Jan 2018 10:24:56 -0500
parents e194eec8e70c
children
line wrap: on
line source

#!/usr/bin/env Rscript

## Package
##--------

library(RUnit)

## Constants
##----------

testOutDirC <- "output"
argVc <- commandArgs(trailingOnly = FALSE)
scriptPathC <- sub("--file=", "", argVc[grep("--file=", argVc)])


## Functions
##-----------

## Reading tables (matrix or data frame)
readTableF <- function(fileC, typeC = c("matrix", "dataframe")[1]) {

    	file.exists(fileC) || stop(paste0("No output file \"", fileC ,"\"."))

        switch(typeC,
               matrix = return(t(as.matrix(read.table(file = fileC,
                   header = TRUE,
                   row.names = 1,
                   sep = "\t",
                   stringsAsFactors = FALSE)))),
               dataframe = return(read.table(file = fileC,
                   header = TRUE,
                   row.names = 1,
                   sep = "\t",
                   stringsAsFactors = FALSE)))

}

## Call wrapper
wrapperCallF <- function(paramLs) {

	## Set program path
    	wrapperPathC <- file.path(dirname(scriptPathC), "..", "checkformat_wrapper.R")

	## Set arguments
	argLs <- NULL
	for (parC in names(paramLs))
		argLs <- c(argLs, parC, paramLs[[parC]])

	## Call
	wrapperCallC <- paste(c(wrapperPathC, argLs), collapse = " ")

        if(.Platform$OS.type == "windows")
            wrapperCallC <- paste("Rscript", wrapperCallC)

	wrapperCodeN <- system(wrapperCallC)

	if (wrapperCodeN != 0)
		stop("Error when running checkformat_wrapper.R.")

	## Get output
	outLs <- list()
	if ("dataMatrix_out" %in% names(paramLs))
            outLs[["datMN"]] <- readTableF(paramLs[["dataMatrix_out"]], "matrix")
	if ("sampleMetadata_out" %in% names(paramLs))
            outLs[["samDF"]] <- readTableF(paramLs[["sampleMetadata_out"]], "dataframe")
	if ("variableMetadata_out" %in% names(paramLs))
            outLs[["varDF"]] <- readTableF(paramLs[["variableMetadata_out"]], "dataframe")
        if("information" %in% names(paramLs))
            outLs[["infVc"]] <- readLines(paramLs[["information"]])

	return(outLs)
}

## Setting default parameters
defaultArgF <- function(testInDirC) {

    defaultArgLs <- list()
    if(file.exists(file.path(dirname(scriptPathC), testInDirC, "dataMatrix.tsv")))
        defaultArgLs[["dataMatrix_in"]] <- file.path(dirname(scriptPathC), testInDirC, "dataMatrix.tsv")
    if(file.exists(file.path(dirname(scriptPathC), testInDirC, "sampleMetadata.tsv")))
        defaultArgLs[["sampleMetadata_in"]] <- file.path(dirname(scriptPathC), testInDirC, "sampleMetadata.tsv")
    if(file.exists(file.path(dirname(scriptPathC), testInDirC, "variableMetadata.tsv")))
        defaultArgLs[["variableMetadata_in"]] <- file.path(dirname(scriptPathC), testInDirC, "variableMetadata.tsv")

    defaultArgLs[["dataMatrix_out"]] <- file.path(dirname(scriptPathC), testOutDirC, "dataMatrix.tsv")
    defaultArgLs[["sampleMetadata_out"]] <- file.path(dirname(scriptPathC), testOutDirC, "sampleMetadata.tsv")
    defaultArgLs[["variableMetadata_out"]] <- file.path(dirname(scriptPathC), testOutDirC, "variableMetadata.tsv")
    defaultArgLs[["information"]] <- file.path(dirname(scriptPathC), testOutDirC, "information.txt")

    defaultArgLs

}

## Main
##-----

## Create output folder
file.exists(testOutDirC) || dir.create(testOutDirC)

## Run tests
test.suite <- defineTestSuite('tests', dirname(scriptPathC), testFileRegexp = paste0('^.*_tests\\.R$'), testFuncRegexp = '^.*$')
isValidTestSuite(test.suite)
test.results <- runTestSuite(test.suite)
print(test.results)