Previous changeset 8:8c5bb7b86df9 (2016-02-22) Next changeset 10:8dd6f0ffa763 (2016-07-04) |
Commit message:
planemo upload commit 9d47e3b467dbbe0af0d90a937c5e9f2c4b958c4b |
modified:
README.rst abims_CAMERA_annotateDiffreport.xml tool_dependencies.xml |
added:
CAMERA.r lib.r macros.xml planemo_test.sh test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv test-data/faahKO.xset.group.retcor.group.fillpeaks.RData test-data/faahKO_reduce.zip |
removed:
Makefile planemo.sh test-data/xset.group.retcor.group.fillPeaks.RData test-data/xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv test-data/xset.group.retcor.group.fillPeaks.annotate.negative.Rdata test-data/xset.group.retcor.group.fillPeaks.annotate.variableMetadata.Xdiffreport.zip test-data/xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 CAMERA.r --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/CAMERA.r Mon Apr 25 11:06:25 2016 -0400 |
[ |
@@ -0,0 +1,175 @@ +#!/usr/bin/env Rscript +# CAMERA.r version="2.2.1" + + + +# ----- PACKAGE ----- +cat("\tPACKAGE INFO\n") + +setRepositories(graphics=F, ind=31) + +#pkgs=c("xcms","batch") +pkgs=c("parallel","BiocGenerics", "Biobase", "Rcpp", "mzR", "xcms","snow","igraph","CAMERA","multtest","batch") +for(p in pkgs) { + suppressPackageStartupMessages(suppressWarnings(library(p, quietly=TRUE, logical.return=TRUE, character.only=TRUE))) + cat(p,"\t",as.character(packageVersion(p)),"\n",sep="") +} +source_local <- function(fname){ argv <- commandArgs(trailingOnly = FALSE); base_dir <- dirname(substring(argv[grep("--file=", argv)], 8)); source(paste(base_dir, fname, sep="/")) } + +cat("\n\n"); + + + +# ----- ARGUMENTS ----- +cat("\tARGUMENTS INFO\n") + +listArguments = parseCommandArgs(evaluate=FALSE) #interpretation of arguments given in command line as an R list of objects +write.table(as.matrix(listArguments), col.names=F, quote=F, sep='\t') + +cat("\n\n"); + + +# ----- PROCESSING INFILE ----- +cat("\tINFILE PROCESSING INFO\n") + +#image is an .RData file necessary to use xset variable given by previous tools +if (!is.null(listArguments[["image"]])){ + load(listArguments[["image"]]); listArguments[["image"]]=NULL +} + +if (listArguments[["xfunction"]] %in% c("combinexsAnnos")) { + load(listArguments[["image_pos"]]) + xaP=xa + listOFlistArgumentsP=listOFlistArguments + if (exists("xsAnnotate_object")) xaP=xsAnnotate_object + + diffrepP=NULL + if (exists("diffrep")) diffrepP=diffrep + + load(listArguments[["image_neg"]]) + xaN=xa + listOFlistArgumentsN=listOFlistArguments + if (exists("xsAnnotate_object")) xaN=xsAnnotate_object + + diffrepN=NULL + if (exists("diffrep")) diffrepN=diffrep +} + + +cat("\n\n") + + +# ----- ARGUMENTS PROCESSING ----- +cat("\tARGUMENTS PROCESSING INFO\n") + +# Save arguments to generate a report +if (!exists("listOFlistArguments")) listOFlistArguments=list() +listOFlistArguments[[paste(format(Sys.time(), "%y%m%d-%H:%M:%S_"),listArguments[["xfunction"]],sep="")]] = listArguments + + +#saving the commun parameters +thefunction = listArguments[["xfunction"]] +listArguments[["xfunction"]]=NULL #delete from the list of arguments + +xsetRdataOutput = paste(thefunction,"RData",sep=".") +if (!is.null(listArguments[["xsetRdataOutput"]])){ + xsetRdataOutput = listArguments[["xsetRdataOutput"]]; listArguments[["xsetRdataOutput"]]=NULL +} + +rplotspdf = "Rplots.pdf" +if (!is.null(listArguments[["rplotspdf"]])){ + rplotspdf = listArguments[["rplotspdf"]]; listArguments[["rplotspdf"]]=NULL +} + +dataMatrixOutput = "dataMatrix.tsv" +if (!is.null(listArguments[["dataMatrixOutput"]])){ + dataMatrixOutput = listArguments[["dataMatrixOutput"]]; listArguments[["dataMatrixOutput"]]=NULL +} + +variableMetadataOutput = "variableMetadata.tsv" +if (!is.null(listArguments[["variableMetadataOutput"]])){ + variableMetadataOutput = listArguments[["variableMetadataOutput"]]; listArguments[["variableMetadataOutput"]]=NULL +} + +if (!is.null(listArguments[["new_file_path"]])){ + new_file_path = listArguments[["new_file_path"]]; listArguments[["new_file_path"]]=NULL +} + +#Import the different functions +source_local("lib.r") + +#necessary to unzip .zip file uploaded to Galaxy +#thanks to .zip file it's possible to upload many file as the same time conserving the tree hierarchy of directories + + +if (!is.null(listArguments[["zipfile"]])){ + zipfile= listArguments[["zipfile"]]; listArguments[["zipfile"]]=NULL +} + +# We unzip automatically the chromatograms from the zip files. +if (thefunction %in% c("annotatediff")) { + if(exists("zipfile") && (zipfile!="")) { + if(!file.exists(zipfile)){ + error_message=paste("Cannot access the Zip file:",zipfile,". Please, contact your administrator ... if you have one!") + print(error_message) + stop(error_message) + } + + #unzip + suppressWarnings(unzip(zipfile, unzip="unzip")) + + #get the directory name + filesInZip=unzip(zipfile, list=T); + directories=unique(unlist(lapply(strsplit(filesInZip$Name,"/"), function(x) x[1]))); + directories=directories[!(directories %in% c("__MACOSX")) & file.info(directories)$isdir] + directory = "." + if (length(directories) == 1) directory = directories + + cat("files_root_directory\t",directory,"\n") + } +} + + + +#addition of xset object to the list of arguments in the first position +if (exists("xset") != 0){ + listArguments=append(list(xset), listArguments) +} + +cat("\n\n") + + + + +# ----- PROCESSING INFO ----- +cat("\tMAIN PROCESSING INFO\n") + +#change the default display settings +pdf(file=rplotspdf, width=16, height=12) + + +if (thefunction %in% c("annotatediff")) { + results_list=annotatediff(xset=xset,listArguments=listArguments,variableMetadataOutput=variableMetadataOutput,dataMatrixOutput=dataMatrixOutput,new_file_path=new_file_path) + xa=results_list[["xa"]] + diffrep=results_list[["diffrep"]] + variableMetadata=results_list[["variableMetadata"]] + + cat("\n\n") + cat("\tXSET OBJECT INFO\n") + print(xa) +} + +if (thefunction %in% c("combinexsAnnos")) { + cAnnot=combinexsAnnos_function(xaP=xaP,xaN=xaN,listOFlistArgumentsP=listOFlistArgumentsP,listOFlistArgumentsN=listOFlistArgumentsN,diffrepP=diffrepP,diffrepN=diffrepN,convert_param=listArguments[["convert_param"]],pos=listArguments[["pos"]],tol=listArguments[["tol"]],ruleset=listArguments[["ruleset"]],keep_meta=listArguments[["keep_meta"]],variableMetadataOutput=variableMetadataOutput) +} + +dev.off() + + +#saving R data in .Rdata file to save the variables used in the present tool +objects2save = c("xa","variableMetadata","diffrep","cAnnot","listOFlistArguments","zipfile") +save(list=objects2save[objects2save %in% ls()], file=xsetRdataOutput) + +cat("\n\n") + +cat("\tDONE\n") |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 Makefile --- a/Makefile Mon Feb 22 16:48:11 2016 -0500 +++ /dev/null Thu Jan 01 00:00:00 1970 +0000 |
[ |
@@ -1,23 +0,0 @@ -# USAGE: make [install|clean] - -# -------- VARIABLE -------- - -OBJ=camera_annotate.tgz -DEP=abims_CAMERA_annotateDiffreport.xml tool_dependencies.xml repository_dependencies.xml static test-data - - -# ------------------------ - -all: $(OBJ) - -$(OBJ): $(DEP) - tar --exclude=".svn" -zchf $@ $^ - -# ------------------------ - -install: $(OBJ) - mv *.tgz ~ - -clean: - rm *.tgz - |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 README.rst --- a/README.rst Mon Feb 22 16:48:11 2016 -0500 +++ b/README.rst Mon Apr 25 11:06:25 2016 -0400 |
b |
@@ -2,7 +2,16 @@ Changelog/News -------------- -**Version 2.1.3 - 10/02/2016** +**Version 2.1.5 - 21/04/2016** + +- UPGRADE: upgrate the CAMERA version from 1.22.0 to 1.26.0 + + +**Version 2.1.4 - 18/04/2016** + +- TEST: refactoring to pass planemo test using conda dependencies + +**Version 2.1.3 - 10/02/2016** - BUGFIX: better management of errors. Datasets remained green although the process failed @@ -27,3 +36,12 @@ - UPDATE: merged with annotateDiffreport. Some parameters are dedicated to experiences with several conditions + +Test Status +----------- + +Planemo test using conda: passed + +Planemo test using source env.sh: passed + +Planemo shed_test : passed |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 abims_CAMERA_annotateDiffreport.xml --- a/abims_CAMERA_annotateDiffreport.xml Mon Feb 22 16:48:11 2016 -0500 +++ b/abims_CAMERA_annotateDiffreport.xml Mon Apr 25 11:06:25 2016 -0400 |
[ |
b'@@ -1,24 +1,16 @@\n-<tool id="abims_CAMERA_annotateDiffreport" name="CAMERA.annotate" version="2.1.3">\n+<tool id="abims_CAMERA_annotateDiffreport" name="CAMERA.annotate" version="2.1.5">\n \n <description>CAMERA annotate function. Returns annotation results (isotope peaks, adducts and fragments) and a diffreport if more than one condition.</description>\n \n- <requirements>\n- <requirement type="package" version="3.1.2">R</requirement>\n- <requirement type="binary">Rscript</requirement>\n- <requirement type="package" version="1.44.0">xcms</requirement>\n- <requirement type="package" version="1.22.0">camera</requirement>\n- <requirement type="package" version="2.2.1">camera_w4m_script</requirement>\n- <requirement type="binary">CAMERA.r</requirement>\n- <requirement type="package" version="1.3.18">graphicsmagick</requirement>\n- <requirement type="binary">convert</requirement>\n- </requirements>\n- \n- <stdio>\n- <exit_code range="1:" level="fatal" />\n- </stdio>\n+ <macros>\n+ <import>macros.xml</import>\n+ </macros>\n+\n+ <expand macro="requirements"/>\n+ <expand macro="stdio"/>\n \n <command><![CDATA[\n- CAMERA.r \n+ @COMMAND_CAMERA_SCRIPT@\n xfunction annotatediff \n image $image\n \n@@ -56,7 +48,10 @@\n new_file_path ${__new_file_path__}/primary_${output_diffreport.id}_\n #end if\n \n- \n+ #if $zip_file:\n+ zipfile $zip_file\n+ #end if\n+\n ]]></command>\n \n <inputs>\n@@ -131,7 +126,9 @@\n <when value="hide">\n </when>\n </conditional>\n- \n+\n+ <!-- To pass planemo test -->\n+ <param name="zip_file" type="data" format="no_unzip.zip,zip" label="Zip file" help="Use only if you get a message which say that your original zip file have been deleted on the server." />\n </inputs>\n \n <outputs>\n@@ -143,13 +140,13 @@\n <when input="quick_block.polarity" value="negative" format="rdata.camera.negative" />\n </change_format>\n </data>\n-\t<data name="output_diffreport" format="text" label="${image.name[:-6]}.annotateDiffreport" hidden="True">\n-\t\t <filter>(options[\'option\'] == \'show\')</filter>\n-\t</data> \n+ <data name="output_diffreport" format="text" label="${image.name[:-6]}.annotateDiffreport" hidden="True">\n+\t\t <filter>(options[\'option\'] == \'show\')</filter>\n+\t </data> \n </outputs>\n \n <tests>\n- <test>\n+ <!--<test>\n <param name="image" value="xset.group.retcor.group.fillPeaks.RData"/>\n <param name="convert_param" value="False"/>\n <param name="num_digits" value="0"/>\n@@ -162,26 +159,60 @@\n <param name="mzabs" value="0.015"/>\n <param name="intval" value="into"/>\n <param name="max_peaks" value="100"/>\n- <param name="quick_block.quick" value="FALSE"/>\n- <param name="quick_block.polarity" value="negative"/>\n- <param name="quick_block.cor_eic_th" value="0.75"/>\n- <param name="quick_block.graphMethod" value="hcs"/>\n- <param name="quick_block.pval" value="0.05"/>\n- <param name="quick_block.calcCiS" value="True"/>\n- <param name="quick_block.calcIso" value="False"/>\n- <param name="quick_block.calcCaS" value="False"/>\n- <param name="quick_block.multiplier" value="3"/>\n- <param name="options.option" value="show"/>\n- <param name="options.eicmax" value="200"/>\n- <param name="options.eicwidth" value="200"/>\n- <param name="options.value" value="into"/>\n- <param name="options.h" value="480"/>\n- <param name="options.w" value="640"/>\n- <param name="options.mzdec" value="2"/>\n- <param name="options.sortpval" value="False"/>\n+ <param name="quick_block|quick" value="FALSE"/>\n+ <param name'..b' <param name="options|value" value="into"/>\n+ <param name="options|h" value="480"/>\n+ <param name="options|w" value="640"/>\n+ <param name="options|mzdec" value="2"/>\n+ <param name="options|sortpval" value="False"/>\n+ <param name="zip_file" value="sacuri_dir_root.zip" ftype="zip" />\n <output name="variableMetadata" file="xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv" />\n <output name="datamatrix" file="xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv" />\n- <output name="rdata" file="xset.group.retcor.group.fillPeaks.annotate.negative.Rdata" />\n+ </test>-->\n+ <test>\n+ <param name="image" value="faahKO.xset.group.retcor.group.fillpeaks.RData"/>\n+ <param name="convert_param" value="False"/>\n+ <param name="num_digits" value="0"/>\n+ <param name="sigma" value="6"/>\n+ <param name="perfwhm" value="0.6"/>\n+ <param name="maxcharge" value="3"/>\n+ <param name="maxiso" value="4"/>\n+ <param name="minfrac" value="0.5"/>\n+ <param name="ppm" value="5"/>\n+ <param name="mzabs" value="0.015"/>\n+ <param name="intval" value="into"/>\n+ <param name="max_peaks" value="100"/>\n+ <param name="quick_block|quick" value="FALSE"/>\n+ <param name="quick_block|polarity" value="negative"/>\n+ <param name="quick_block|cor_eic_th" value="0.75"/>\n+ <param name="quick_block|graphMethod" value="hcs"/>\n+ <param name="quick_block|pval" value="0.05"/>\n+ <param name="quick_block|calcCiS" value="True"/>\n+ <param name="quick_block|calcIso" value="False"/>\n+ <param name="quick_block|calcCaS" value="False"/>\n+ <param name="quick_block|multiplier" value="3"/>\n+ <param name="options|option" value="show"/>\n+ <param name="options|eicmax" value="200"/>\n+ <param name="options|eicwidth" value="200"/>\n+ <param name="options|value" value="into"/>\n+ <param name="options|h" value="480"/>\n+ <param name="options|w" value="640"/>\n+ <param name="options|mzdec" value="2"/>\n+ <param name="options|sortpval" value="False"/>\n+ <param name="zip_file" value="faahKO_reduce.zip" ftype="zip" />\n+ <output name="variableMetadata" file="faahKO.xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv" />\n+ <output name="datamatrix" file="faahKO.xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv" />\n </test>\n </tests>\n \n@@ -189,18 +220,7 @@\n \n <help><![CDATA[\n \n-.. class:: infomark\n-\n-**Authors** Carsten Kuhl ckuhl@ipb-halle.de, Ralf Tautenhahn rtautenh@scripps.edu, Steffen Neumann sneumann@@ipb-halle.de\n-\n-.. class:: infomark\n-\n-**Galaxy integration** ABiMS TEAM - UPMC/CNRS - Station biologique de Roscoff and Yann Guitton yann.guitton@univ-nantes.fr - part of Workflow4Metabolomics.org [W4M]\n-\n- | Contact support@workflow4metabolomics.org for any questions or concerns about the Galaxy implementation of this tool.\n-\n----------------------------------------------------\n-\n+@HELP_AUTHORS@\n \n ================\n CAMERA.annotate\n@@ -378,7 +398,17 @@\n Changelog/News\n --------------\n \n-**Version 2.1.3 - 10/02/2016**\n+**Version 2.1.5 - 21/04/2016**\n+\n+- UPGRADE: upgrate the CAMERA version from 1.22.0 to 1.26.0\n+\n+\n+**Version 2.1.4 - 18/04/2016**\n+\n+- TEST: refactoring to pass planemo test using conda dependencies\n+\n+\n+**Version 2.1.3 - 10/02/2016**\n \n - BUGFIX: better management of errors. Datasets remained green although the process failed\n \n@@ -405,10 +435,7 @@\n \n ]]></help>\n \n- <citations>\n- <citation type="doi">10.1021/ac202450g</citation>\n- <citation type="doi">10.1093/bioinformatics/btu813</citation>\n- </citations>\n+ <expand macro="citation" />\n \n \n </tool>\n' |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 lib.r --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/lib.r Mon Apr 25 11:06:25 2016 -0400 |
[ |
b'@@ -0,0 +1,188 @@\n+# lib.r version="2.2.1"\n+\n+#The function create a pdf from the different png generated by diffreport\n+diffreport_png2pdf <- function(filebase, new_file_path) {\n+\n+ pdfEicOutput = paste(new_file_path,filebase,"-eic_visible_pdf",sep="")\n+ pdfBoxOutput = paste(new_file_path,filebase,"-box_visible_pdf",sep="")\n+\n+ system(paste("gm convert ",filebase,"_eic/*.png ",filebase,"_eic.pdf",sep=""))\n+ system(paste("gm convert ",filebase,"_box/*.png ",filebase,"_box.pdf",sep=""))\n+\n+ file.copy(paste(filebase,"_eic.pdf",sep=""), pdfEicOutput)\n+ file.copy(paste(filebase,"_box.pdf",sep=""), pdfBoxOutput)\n+}\n+\n+#The function annotateDiffreport without the corr function which bugs\n+annotatediff <- function(xset=xset, listArguments=listArguments, variableMetadataOutput="variableMetadata.tsv", dataMatrixOutput="dataMatrix.tsv",new_file_path=NULL) {\n+ # Resolve the bug with x11, with the function png\n+ options(bitmapType=\'cairo\')\n+\n+ #Check if the fillpeaks step has been done previously, if it hasn\'t, there is an error message and the execution is stopped.\n+ res=try(is.null(xset@filled))\n+\n+ # ------ annot -------\n+ listArguments[["calcCiS"]]=as.logical(listArguments[["calcCiS"]])\n+ listArguments[["calcIso"]]=as.logical(listArguments[["calcIso"]])\n+ listArguments[["calcCaS"]]=as.logical(listArguments[["calcCaS"]])\n+\n+ #graphMethod parameter bugs where this parameter is not defined in quick=true\n+ if(listArguments[["quick"]]==TRUE) {\n+ xa= annotate(object=xset,nSlaves=1,sigma=listArguments[["sigma"]],perfwhm=listArguments[["perfwhm"]],maxcharge=listArguments[["maxcharge"]],maxiso=listArguments[["maxiso"]],minfrac=listArguments[["minfrac"]],ppm=listArguments[["ppm"]],mzabs=listArguments[["mzabs"]],quick=listArguments[["quick"]],polarity=listArguments[["polarity"]],max_peaks=listArguments[["max_peaks"]],intval=listArguments[["intval"]])\n+ }\n+ else {\n+ xa= annotate(object=xset,nSlaves=1,sigma=listArguments[["sigma"]],perfwhm=listArguments[["perfwhm"]],graphMethod=listArguments[["graphMethod"]],cor_eic_th=listArguments[["cor_eic_th"]],pval=listArguments[["pval"]],calcCiS=listArguments[["calcCiS"]],calcIso=listArguments[["calcIso"]],calcCaS=listArguments[["calcCaS"]],multiplier=listArguments[["multiplier"]],maxcharge=listArguments[["maxcharge"]],maxiso=listArguments[["maxiso"]],minfrac=listArguments[["minfrac"]],ppm=listArguments[["ppm"]],mzabs=listArguments[["mzabs"]],quick=listArguments[["quick"]],polarity=listArguments[["polarity"]],max_peaks=listArguments[["max_peaks"]],intval=listArguments[["intval"]])\n+\n+ } \n+ peakList=getPeaklist(xa,intval=listArguments[["intval"]])\n+ peakList=cbind(groupnames(xa@xcmsSet),peakList); colnames(peakList)[1] = c("name");\n+\n+\n+ # --- Multi condition : diffreport --- \n+ diffrep=NULL\n+ if (!is.null(listArguments[["runDiffreport"]]) & nlevels(sampclass(xset))>=2) {\n+ #Check if the fillpeaks step has been done previously, if it hasn\'t, there is an error message and the execution is stopped.\n+ res=try(is.null(xset@filled))\n+ classes=levels(sampclass(xset))\n+ x=1:(length(classes)-1)\n+ for (i in seq(along=x) ) {\n+ y=1:(length(classes))\n+ for (n in seq(along=y)){\n+ if(i+n <= length(classes)){\n+ filebase=paste(classes[i],class2=classes[i+n],sep="-vs-")\n+\n+ diffrep=diffreport(object=xset,class1=classes[i],class2=classes[i+n],filebase=filebase,eicmax=listArguments[["eicmax"]],eicwidth=listArguments[["eicwidth"]],sortpval=TRUE,value=listArguments[["value"]],h=listArguments[["h"]],w=listArguments[["w"]],mzdec=listArguments[["mzdec"]])\n+ #combines results\n+ diffreportTSV=merge(peakList, diffrep[,c("name","fold","tstat","pvalue")], by.x="name", by.y="name", sort=F)\n+ diffreportTSV=cbind(diffreportTSV[,!(colnames(diffreportTSV) %in% c(sampnames(xa@xcmsSet)))],diffreportTSV[,(colnames(diffreportTSV) %in% c(sampnames(xa@xcmsSet)))])\n+\n+ if(listArguments[["sortpval"]]){\n+ diffreportTSV=diffr'..b'["num_digits"]]),"T",round(variableMetadata$rt),sep="") \n+ write.table(variableMetadata, sep="\\t", quote=FALSE, row.names=FALSE, file=variableMetadataOutput)\n+\n+ # --- dataMatrix ---\n+ dataMatrix = peakList[,(make.names(colnames(peakList)) %in% c(make.names(sampnames(xa@xcmsSet))))]\n+ dataMatrix=cbind(peakList$name,dataMatrix); colnames(dataMatrix)[1] = c("name");\n+\n+ if (listArguments[["convert_param"]]){\n+ #converting the retention times (seconds) into minutes\n+ print("converting the retention times into minutes in the dataMatrix ids")\n+ peakList$rt=peakList$rt/60\n+ }\n+ dataMatrix$name= paste("M",round(peakList$mz,digits=listArguments[["num_digits"]]),"T",round(peakList$rt),sep="")\n+ write.table(dataMatrix, sep="\\t", quote=FALSE, row.names=FALSE, file=dataMatrixOutput)\n+ \n+ return(list("xa"=xa,"diffrep"=diffrep,"variableMetadata"=variableMetadataOri));\n+\n+}\n+\n+\n+combinexsAnnos_function <- function(xaP, xaN, listOFlistArgumentsP,listOFlistArgumentsN, diffrepP=NULL,diffrepN=NULL,convert_param=FALSE,pos=TRUE,tol=2,ruleset=NULL,keep_meta=TRUE, variableMetadataOutput="variableMetadata.tsv"){\n+\n+ #Load the two Rdata to extract the xset objects from positive and negative mode\n+ cat("\\tObject xset from positive mode\\n")\n+ print(xaP)\n+ cat("\\n") \n+\n+ cat("\\tObject xset from negative mode\\n")\n+ print(xaN)\n+ cat("\\n")\n+ \n+ cat("\\n")\n+ cat("\\tCombining...\\n")\n+ #Convert the string to numeric for creating matrix\n+ row=as.numeric(strsplit(ruleset,",")[[1]][1])\n+ column=as.numeric(strsplit(ruleset,",")[[1]][2])\n+ ruleset=cbind(row,column)\n+ #Test if the file comes from an older version tool\n+ if ((!is.null(xaP)) & (!is.null(xaN))) {\n+ #Launch the combinexsannos function from CAMERA\n+ cAnnot=combinexsAnnos(xaP, xaN,pos=pos,tol=tol,ruleset=ruleset)\n+ } else {\n+ stop("You must relauch the CAMERA.annotate step with the lastest version.")\n+ }\n+\n+ \n+\n+ if(pos){\n+ xa=xaP\n+ listOFlistArgumentsP=listOFlistArguments\n+ mode="neg. Mode"\n+ } else {\n+ xa=xaN\n+ listOFlistArgumentsN=listOFlistArguments\n+ mode="pos. Mode"\n+ }\n+ intval = "into"; for (steps in names(listOFlistArguments)) { if (!is.null(listOFlistArguments[[steps]]$intval)) intval = listOFlistArguments[[steps]]$intval }\n+ peakList=getPeaklist(xa,intval=intval)\n+ peakList=cbind(groupnames(xa@xcmsSet),peakList); colnames(peakList)[1] = c("name");\n+ variableMetadata=cbind(peakList, cAnnot[, c("isotopes", "adduct", "pcgroup",mode)]);\n+ variableMetadata=variableMetadata[,!(colnames(variableMetadata) %in% c(sampnames(xa@xcmsSet)))]\n+\n+ #Test if there are more than two classes (conditions)\n+ if ( nlevels(sampclass(xaP@xcmsSet))==2 & (!is.null(diffrepN)) & (!is.null(diffrepP))) {\n+ diffrepP = diffrepP[,c("name","fold","tstat","pvalue")]; colnames(diffrepP) = paste("P.",colnames(diffrepP),sep="")\n+ diffrepN = diffrepN[,c("name","fold","tstat","pvalue")]; colnames(diffrepN) = paste("N.",colnames(diffrepN),sep="")\n+ \n+ variableMetadata = merge(variableMetadata, diffrepP, by.x="name", by.y="P.name")\n+ variableMetadata = merge(variableMetadata, diffrepN, by.x="name", by.y="N.name")\n+ } \n+ \n+ rownames(variableMetadata) = NULL\n+ #TODO: checker\n+ #colnames(variableMetadata)[1:2] = c("name","mz/rt");\n+\n+ #If the user want to convert the retention times (seconds) into minutes.\n+ if (listArguments[["convert_param"]]){\n+ #converting the retention times (seconds) into minutes\n+ cat("\\tConverting the retention times into minutes\\n")\n+ variableMetadata$rtmed=cAnnot$rt/60; variableMetadata$rtmin=cAnnot$rtmin/60; variableMetadata$rtmax=cAnnot$rtmax/60;\n+ }\n+\n+ #If the user want to keep only the metabolites which match a difference\n+ if(keep_meta){\n+ variableMetadata=variableMetadata[variableMetadata[,c(mode)]!="",]\n+ }\n+ \n+ #Write the output into a tsv file\n+ write.table(variableMetadata, sep="\\t", quote=FALSE, row.names=FALSE, file=variableMetadataOutput)\n+ return(variableMetadata);\n+\n+}\n' |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 macros.xml --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/macros.xml Mon Apr 25 11:06:25 2016 -0400 |
[ |
@@ -0,0 +1,46 @@ +<?xml version="1.0"?> +<macros> + <xml name="requirements"> + <requirements> + <requirement type="package" version="3.1.2">R</requirement> + <requirement type="package" version="0.4_1">r-snow</requirement> + <requirement type="package" version="1.26.0">bioconductor-camera</requirement> + <requirement type="package" version="2.26.0">bioconductor-multtest</requirement> + <requirement type="package" version="1.1_4">r-batch</requirement> + <requirement type="package" version="1.6.17">libpng</requirement> + <requirement type="package" version="1.3.20">graphicsmagick</requirement> + </requirements> + </xml> + <xml name="stdio"> + <stdio> + <exit_code range="1" level="fatal" /> + </stdio> + </xml> + + <token name="@COMMAND_CAMERA_SCRIPT@"> + LANG=C Rscript $__tool_directory__/CAMERA.r + </token> + + <token name="@HELP_AUTHORS@"> +.. class:: infomark + +**Authors** Colin A. Smith csmith@scripps.edu, Ralf Tautenhahn rtautenh@gmail.com, Steffen Neumann sneumann@ipb-halle.de, Paul Benton hpaul.benton08@imperial.ac.uk and Christopher Conley cjconley@ucdavis.edu + +.. class:: infomark + +**Galaxy integration** ABiMS TEAM - UPMC/CNRS - Station biologique de Roscoff and Yann Guitton yann.guitton@oniris-nantes.fr - part of Workflow4Metabolomics.org [W4M] + + | Contact support@workflow4metabolomics.org for any questions or concerns about the Galaxy implementation of this tool. + +--------------------------------------------------- + + </token> + + + <xml name="citation"> + <citations> + <citation type="doi">10.1021/ac202450g</citation> + <citation type="doi">10.1093/bioinformatics/btu813</citation> + </citations> + </xml> +</macros> |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 planemo.sh --- a/planemo.sh Mon Feb 22 16:48:11 2016 -0500 +++ /dev/null Thu Jan 01 00:00:00 1970 +0000 |
[ |
@@ -1,1 +0,0 @@ -planemo shed_init -f --name=camera_annotate --owner=lecorguille --description="[W4M][GC-MS] CAMERA R Package - Preprocessing - Returns annotation results (isotope peaks, adducts and fragments)" --homepage_url="http://workflow4metabolomics.org" --long_description="Part of the W4M project: http://workflow4metabolomics.org CAMERA: http://bioconductor.org/packages/release/bioc/html/CAMERA.html Wrapper skript for automatic annotation of isotope peaks, adducts and fragments for a (grouped) xcmsSet xs. The function returns an xsAnnotate object. BEWARE: this tool don't come with its script. You will need to install the dedicated package_camara_w4m_script too" --category="Metabolomics" |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 planemo_test.sh --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/planemo_test.sh Mon Apr 25 11:06:25 2016 -0400 |
[ |
@@ -0,0 +1,29 @@ +# Example of planemo command to launch test + +# Note: --galaxy_branch "dev" is set to deal with zip file + + +# -- Use of installed package environments +# after having installing package on a local galaxy instance +source /w/galaxy/dev/shed_tools_tool_dependency_dir/R/3.1.2/iuc/package_r_3_1_2/1ca39eb16186/env.sh +source /w/galaxy/dev/shed_tools_tool_dependency_dir/bioconductor-camera/1.22.0/lecorguille/package_bioconductor_camera_1_22_0/22cec61d66c2/env.sh +planemo test --install_galaxy --galaxy_branch "dev" + +#All 1 test(s) executed passed. +#abims_CAMERA_annotateDiffreport[0]: passed + + +# -- Use of conda dependencies +planemo conda_init --conda_prefix /tmp/mc +planemo conda_install --conda_prefix /tmp/mc . +planemo test --install_galaxy --conda_prefix /tmp/mc --conda_dependency_resolution --galaxy_branch "dev" + +#All 1 test(s) executed passed. +#abims_CAMERA_annotateDiffreport[0]: passed + + +# -- Use of shed_test +planemo shed_test --install_galaxy -t testtoolshed --galaxy_branch "dev" + +#All 1 test(s) executed passed. +#testtoolshed.g2.bx.psu.edu/repos/lecorguille/camera_annotate/abims_CAMERA_annotateDiffreport/2.1.3[0]: passed |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv Mon Apr 25 11:06:25 2016 -0400 |
b |
b'@@ -0,0 +1,8158 @@\n+name\tko15\tko16\twt15\twt16\n+M200T2874\t76871.5724822568\t506848.884266667\t54795.557051693\t70712.7019597617\n+M200T3877\t1144.01499999999\t508.190132093174\t167.153311923928\t0\n+M200T3676\t0\t0\t5108.15999999988\t3298.99587926868\n+M200T3486\t6029.94499999992\t0\t0\t0\n+M200T3529\t0\t0\t4586.52650000006\t0\n+M200T3184\t0\t4333.4849999999\t0\t0\n+M200T3817\t0\t0\t1018.81499999998\t0\n+M200T3978\t0\t0\t0\t1242.61000000004\n+M201T3544\t0\t2863.6449999999\t0\t0\n+M201T4063\t0\t0\t1339.64000000005\t212.633272048894\n+M201T3783\t0\t0\t1680.81000000006\t0\n+M201T3274\t0\t1428.56579382624\t4090.91000000014\t2632.56262635375\n+M201T2556\t0\t14307.2299999999\t0\t0\n+M201T3626\t0\t1129.74329389996\t846.832572052814\t2931.24499999993\n+M201T3138\t23998.304598303\t254581.758476187\t61872.928839246\t23938.5867670927\n+M201T3509\t4023.61499999999\t716.684794188254\t0\t0\n+M201T4066\t354.759136757153\t120.799333675191\t1275.47500000004\t217.235067034405\n+M201T3687\t0\t0\t2906.20499999993\t0\n+M201T3998\t0\t0\t1657.33500000006\t0\n+M201T3799\t0\t0\t628.988532860297\t3245.80999999992\n+M201T3936\t0\t0\t1284.72816666668\t0\n+M201T4037\t0\t0\t0\t1220.69999999998\n+M201T4155\t0\t774.575999999962\t0\t0\n+M201T3883\t0\t1220.70000000004\t596.06839236263\t0\n+M202T3855\t892.050000000031\t0\t0\t0\n+M202T4020\t0\t0\t831.015000000029\t0\n+M202T3301\t2759.095\t0\t203.041783144463\t0\n+M202T4069\t515.477113310478\t0\t754.233600000007\t0\n+M202T3280\t0\t3872.96250000005\t0\t0\n+M202T3321\t3588.54500000001\t0\t2184.14587440592\t680.752724149015\n+M202T3171\t7682.58500000004\t0\t0\t0\n+M202T3763\t0\t0\t1151.71733333335\t0\n+M202T3377\t9879.84499999977\t0\t0\t0\n+M202T3269\t77227.3769090911\t4845.50686607645\t43819.3479046752\t9586.93001142395\n+M202T4141\t0\t0\t0\t732.419999999983\n+M202T4033\t0\t688.600000000024\t0\t0\n+M202T3895\t248.545776466807\t841.96999999998\t0\t3098.52044641804\n+M202T4009\t1147.18712241809\t1629.165\t764.696680521557\t472.632308163321\n+M202T3186\t10430.8884626037\t3806.07999999999\t1823.13851904744\t2108.81069363708\n+M202T2900\t36435.3079999996\t5925.29111289948\t18920.5714858276\t5543.76952406103\n+M202T3943\t0\t0\t1461.71\t131.70361488243\n+M202T3292\t0\t0\t0\t3372.57500000002\n+M203T4038\t0\t0\t0\t978.124999999977\n+M203T3317\t0\t0\t0\t1136.19000000004\n+M203T3306\t431.124790089052\t1694.89499999996\t0\t2048.62135448795\n+M203T3979\t527.419034783012\t0\t2796.65500000002\t2329.6554046415\n+M203T4141\t0\t1020.37999999998\t124.572393433318\t691.733108650811\n+M203T3348\t0\t2974.74816666671\t0\t0\n+M203T3327\t3852.53759999981\t0\t0\t0\n+M203T2679\t0\t0\t0\t6346.07499999991\n+M203T4179\t257.608663224945\t804.409999999981\t0\t750.373044499613\n+M203T3790\t0\t2690.23500000009\t374.050323368023\t795.962510881292\n+M203T3722\t639.681095784589\t0\t0\t3345.96999999992\n+M203T4057\t0\t0\t832.191847925998\t1550.91499999999\n+M204T3523\t0\t110.759221778917\t967.169999999987\t0\n+M204T3061\t3905.96266666662\t0\t0\t0\n+M204T4128\t0\t0\t0\t793.455000000074\n+M204T3665\t3002.85120000003\t0\t401.30435850189\t0\n+M204T4023\t1111.14999999999\t1447.15657402239\t0\t109.024210593649\n+M204T4142\t0\t0\t0\t1089.24000000004\n+M204T3843\t0\t419.889287204237\t1676.11500000006\t1632.68532194826\n+M204T3397\t964.058693506483\t162.861069898986\t691.3363891851\t1586.91\n+M204T2627\t0\t0\t3518.12000000012\t0\n+M204T4075\t0\t1062.63500000004\t0\t0\n+M204T3703\t0\t0\t0\t1446.05999999997\n+M204T3597\t405.142351380973\t0\t0\t1032.90000000004\n+M205T3574\t1707.7862088125\t0\t0\t2466.43999999994\n+M205T2586\t0\t0\t2287.73759999989\t9189.67999999988\n+M205T2787\t1924712.01585714\t1757150.9648\t2129885.09357143\t1634341.9855862\n+M205T4040\t2600.69759999987\t0\t0\t0\n+M205T3782\t2777.8750000001\t0\t5180.14999999997\t0\n+M205T3917\t0\t3392.55866666671\t285.445337336418\t910.731294074392\n+M205T3761\t0\t0\t2425.44000000002\t0\n+M205T4064\t0\t0\t1198.79000000004\t0\n+M206T4080\t0\t575.630156425085\t793.454999999982\t0\n+M206T3292\t0\t0\t0\t1023.50999999998\n+M206T3088\t0\t0\t0\t4682.47999999989\n+M206T3350\t226.392005428193\t0\t641.649999999985\t0\n+M206T4105\t1685.41525000004\t1169.58129372772\t874.647416671435\t271.335617444158\n+M206T3192\t1563.6763381678\t10174.0649999999\t0\t438.085464589443\n+M206T2786\t213659.293920001\t283980.633536123\t253825.557279999\t241844.442068965\n+M206T3444\t1711.85904903243\t5245.74642732371\t4162.05892651987\t3090.62'..b'8T3915\t2421.055\t0\t0\t0\n+M598T4240\t780.835199999962\t0\t0\t0\n+M598T3872\t0\t0\t923.232000000008\t0\n+M598T2842\t4328.7899999999\t0\t0\t0\n+M598T2529\t0\t0\t3350.66499999992\t0\n+M598T2738\t0\t1410.85151214631\t3392.92\t0\n+M598T3057\t1964.95661826158\t0\t3904.17600000003\t0\n+M598T2566\t428.80999999999\t704.249999999984\t5259.96499999993\t419.366399999979\n+M598T3685\t0\t0\t0\t2907.39840000003\n+M598T3161\t0\t1976.32135156572\t0\t1547.78500000005\n+M598T3574\t4893.75500000017\t0\t0\t0\n+M598T3247\t0\t0\t11160.015\t0\n+M598T3740\t6735.75999999984\t1507.48470651824\t0\t1204.11021794332\n+M598T2986\t2726.56464877876\t7907.94500000028\t1858.99545730168\t0\n+M598T3721\t7601.78150954762\t29323.4050000004\t0\t48876.8056363635\n+M598T3848\t0\t19344.1924374998\t2689.81421000592\t19147.856234332\n+M598T4223\t0\t0\t0\t852.92499999998\n+M598T3218\t0\t16185.5021250003\t7823.81125148536\t2693.06700579228\n+M598T2831\t5337.7886250001\t2892.25018630074\t2041.28568142639\t0\n+M598T3699\t23655.1372269246\t0\t8555.87680238366\t28572.205000001\n+M598T3811\t10279.2954993742\t201593.909999999\t6054.00661583122\t38867.0801165145\n+M598T3705\t18053.2113055963\t307529.419597421\t16924.3734137891\t65022.6200000009\n+M598T3493\t0\t0\t9308.62000000032\t0\n+M598T3116\t3137.82499999993\t0\t0\t0\n+M598T4234\t1558.64039999994\t0\t433.505000000001\t282.560050600392\n+M598T3368\t6528.77505295252\t0\t0\t7501.04499999995\n+M598T3406\t2523.54098664481\t711.921989369875\t4532.24000000016\t0\n+M598T3822\t910.075584336678\t126881.278714286\t3278.69127651828\t0\n+M598T2677\t0\t2826.02880000002\t0\t0\n+M598T2662\t2139.08160000002\t0\t0\t238.034675483067\n+M598T2956\t5756.0700000002\t1517.11899102972\t0\t0\n+M598T3177\t0\t2838.6076666667\t0\t0\n+M598T2531\t0\t1600.99499999996\t0\t259.78999999999\n+M598T4020\t4444.59999999997\t0\t0\t0\n+M598T2762\t0\t5078.42499999999\t1057.00399020397\t0\n+M599T4229\t0\t267.670604372541\t0\t881.094999999979\n+M599T3183\t0\t0\t0\t2164.39499999999\n+M599T2931\t0\t2557.20999999994\t0\t0\n+M599T2850\t0\t0\t0\t3757.56499999997\n+M599T2619\t0\t2237.94999999995\t0\t1052.80414846231\n+M599T3091\t0\t0\t0\t5745.1150000002\n+M599T2620\t24597.6221333335\t1782.1843965059\t2466.61604554878\t2547.59399043552\n+M599T4187\t136.620679491087\t0\t769.979999999982\t0\n+M599T2881\t5238.07829488764\t1749.21839582845\t2554.91912426183\t3269.28500000002\n+M599T3739\t0\t8220.94499999976\t0\t1042.07319821065\n+M599T4202\t1370.93999999996\t0\t404.178568977319\t115.970242221925\n+M599T4160\t2031.49238929167\t8068.71033333314\t4524.36445961151\t5823.36499999964\n+M599T3701\t0\t0\t55051.9369090907\t0\n+M599T3473\t1906.58949953166\t1115.24697230194\t6239.51160209002\t6298.5500000001\n+M599T4137\t3531.90007828117\t607.713962924625\t13849.6178571426\t0\n+M599T3845\t0\t0\t5238.05500000018\t7674.11104164754\n+M599T3722\t22852.13\t0\t0\t0\n+M599T3978\t0\t15327.6100000005\t2043.71536740086\t0\n+M599T4055\t798856.451441174\t53721.8508316141\t897286.005000001\t60505.2372470137\n+M599T3926\t28263.7381960734\t1934575.64687074\t31095.0992688255\t2271127.28014893\n+M599T3741\t2472129.73859259\t0\t1909653.70493332\t7165.99058468708\n+M599T3433\t35592.8437333336\t1352.22852619787\t0\t7482.12284985986\n+M599T4127\t185983.548870884\t536493.298793183\t75567.9488087375\t707685.939314288\n+M599T3728\t93179.0431097422\t0\t797434.72246154\t0\n+M599T4125\t2425.45826820981\t354770.43852632\t19846.7110475478\t239730.793013582\n+M599T2844\t0\t5415.77280000005\t1593.6345093066\t1186.34708319397\n+M599T2970\t8188.19424252287\t7861.19461826181\t0\t12502.4521250001\n+M599T3812\t79625.6350000028\t11601.8667295452\t19502.9954796907\t1381.41279238145\n+M600T2728\t0\t0\t0\t1760.62499999996\n+M600T3605\t0\t0\t0\t5001.73999999997\n+M600T3410\t3353.79499999992\t0\t0\t0\n+M600T3002\t0\t5849.96999999986\t0\t0\n+M600T2526\t0\t0\t3209.81499999996\t0\n+M600T2559\t0\t2928.1150000001\t0\t0\n+M600T2605\t6022.12000000021\t796.585000000028\t0\t2331.63714285708\n+M600T2778\t0\t0\t0\t2608.74386666668\n+M600T3440\t0\t8782.77999999999\t0\t0\n+M600T3074\t2505.99623596844\t0\t0\t3430.04160000003\n+M600T2840\t0\t0\t0\t1987.33833333336\n+M600T3456\t4671.52499999989\t0\t0\t1358.70443022736\n+M600T3351\t2327.15500000008\t0\t0\t0\n+M600T2539\t0\t3639.80233333338\t0\t1359.81120000001\n+M600T3208\t7784.31000000027\t1147.23597499922\t0\t2048.69405448434\n+M600T2969\t9211.58999999991\t0\t0\t5345.43474031158\n' |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv Mon Apr 25 11:06:25 2016 -0400 |
[ |
b'@@ -0,0 +1,8158 @@\n+name\tmz\tmzmin\tmzmax\trt\trtmin\trtmax\tnpeaks\tKO\tWT\tisotopes\tadduct\tpcgroup\tfold\ttstat\tpvalue\n+M200T2874\t200.100006103516\t200.100006103516\t200.100006103516\t2873.66790279219\t2873.66790279219\t2873.66790279219\t1\t1\t0\t\t\t4758\t4.65085295060662\t-1.06493655910147\t0.479605513245819\n+M200T3877\t200.199996948242\t200.199996948242\t200.199996948242\t3876.72559155354\t3876.72559155354\t3876.72559155354\t1\t1\t0\t\t\t2728\t9.88436970273782\t-2.25887629759232\t0.240554009337641\n+M200T3676\t200.199996948242\t200.199996948242\t200.199996948242\t3676.20857473389\t3676.20857473389\t3676.20857473389\t1\t0\t1\t\t\t3702\tInf\t4.64698353395969\t0.13493854409364\n+M200T3486\t200.199996948242\t200.199996948242\t200.199996948242\t3485.71318236608\t3485.71318236608\t3485.71318236608\t1\t1\t0\t\t\t1771\tInf\t-1\t0.5\n+M200T3529\t200.199996948242\t200.199996948242\t200.199996948242\t3529.16673849327\t3529.16673849327\t3529.16673849327\t1\t0\t1\t\t\t370\tInf\t1\t0.5\n+M200T3184\t200.199996948242\t200.199996948242\t200.199996948242\t3184.44736675265\t3184.44736675265\t3184.44736675265\t1\t1\t0\t\t\t40\tInf\t-1\t0.5\n+M200T3817\t200.300003051758\t200.300003051758\t200.300003051758\t3816.57302395962\t3816.57302395962\t3816.57302395962\t1\t0\t1\t\t\t2375\tInf\t1\t0.5\n+M200T3978\t200.300003051758\t200.300003051758\t200.300003051758\t3977.60008277685\t3977.60008277685\t3977.60008277685\t1\t0\t1\t\t\t1981\tInf\t1\t0.5\n+M201T3544\t200.800003051758\t200.800003051758\t200.800003051758\t3543.60312635477\t3543.60312635477\t3543.60312635477\t1\t1\t0\t\t\t2331\tInf\t-1\t0.5\n+M201T4063\t200.800003051758\t200.800003051758\t200.800003051758\t4062.56884383761\t4062.56884383761\t4062.56884383761\t1\t0\t1\t\t\t213\tInf\t1.37734161966442\t0.399789013602801\n+M201T3783\t200.800003051758\t200.800003051758\t200.800003051758\t3783.31394298599\t3783.31394298599\t3783.31394298599\t1\t0\t1\t\t\t3662\tInf\t1\t0.5\n+M201T3274\t200.900009155273\t200.900009155273\t200.900009155273\t3273.93376916172\t3273.93376916172\t3273.93376916172\t1\t0\t1\t\t\t5027\t4.70644940219791\t2.59368058676224\t0.122082365514126\n+M201T2556\t200.900009155273\t200.900009155273\t200.900009155273\t2555.90497459635\t2555.90497459635\t2555.90497459635\t1\t1\t0\t\t\t3065\tInf\t-1\t0.5\n+M201T3626\t200.900009155273\t200.900009155273\t200.900009155273\t3625.94998801881\t3625.94998801881\t3625.94998801881\t1\t0\t1\t\t\t1600\t3.34419119144363\t1.11702356726728\t0.408252476299869\n+M201T3138\t201.100006103516\t201.100006103516\t201.100006103516\t3138.35441665664\t3138.35441665664\t3138.35441665664\t1\t1\t0\t\t\t67\t3.24641816551149\t-0.824914731473309\t0.555087522533288\n+M201T3509\t201.199996948242\t201.199996948242\t201.199996948242\t3509.36563736658\t3509.36563736658\t3509.36563736658\t1\t1\t0\t\t\t4513\tInf\t-1.43344416094946\t0.387782408900977\n+M201T4066\t201.199996948242\t201.199996948242\t201.199996948242\t4065.72082744082\t4065.72082744082\t4065.72082744082\t1\t0\t1\t\t\t3859\t3.13885706983073\t0.938510278186573\t0.508748560086896\n+M201T3687\t201.199996948242\t201.199996948242\t201.199996948242\t3687.18932031058\t3687.18932031058\t3687.18932031058\t1\t0\t1\t\t\t573\tInf\t1\t0.5\n+M201T3998\t201.199996948242\t201.199996948242\t201.199996948242\t3997.93594451384\t3997.93594451384\t3997.93594451384\t1\t0\t1\t\t\t6148\tInf\t1\t0.5\n+M201T3799\t201.199996948242\t201.199996948242\t201.199996948242\t3798.65479588899\t3798.65479588899\t3798.65479588899\t1\t0\t1\t\t\t2829\tInf\t1.48072712698114\t0.378143149183639\n+M201T3936\t201.300003051758\t201.300003051758\t201.300003051758\t3936.43507866832\t3936.43507866832\t3936.43507866832\t1\t0\t1\t\t\t4130\tInf\t1\t0.5\n+M201T4037\t201.300003051758\t201.300003051758\t201.300003051758\t4036.91062955396\t4036.91062955396\t4036.91062955396\t1\t0\t1\t\t\t3747\tInf\t1\t0.5\n+M201T4155\t201.300003051758\t201.300003051758\t201.300003051758\t4155.07274902879\t4155.07274902879\t4155.07274902879\t1\t1\t0\t\t\t306\tInf\t-1\t0.5\n+M201T3883\t201.300003051758\t201.300003051758\t201.300003051758\t3882.59075902174\t3882.59075902174\t3882.59075902174\t1\t1\t0\t\t\t2221\t2.04791935898759\t-0.459809553421658\t0.705094466870333\n+M202T3855\t201.699996948242\t201.699996948242\t201.699996948242\t3854.64092716079\t3854.64092716079\t3854.64092716079\t1\t1\t0\t\t\t1344\tInf\t-1\t0.5\n+M202T4020\t201.699996948242\t201.699996948242\t201.699996948242\t4020.0088386'..b'1\t0\t\t\t3458\tInf\t-1\t0.5\n+M599T3978\t599.200012207031\t599.200012207031\t599.200012207031\t3977.82980682972\t3977.82980682972\t3977.82980682972\t1\t1\t0\t\t\t2070\t7.49987510222314\t-0.859061729735218\t0.544156898990986\n+M599T4055\t599.299987792969\t599.299987792969\t599.299987792969\t4054.68845399697\t4054.68845399697\t4059.09018753112\t3\t1\t1\t\t\t3410\t1.12340560356011\t0.0939016699101903\t0.933848304485567\n+M599T3926\t599.299987792969\t599.299987792969\t599.299987792969\t3925.84217251709\t3925.84217251709\t3925.84217251709\t2\t0\t1\t\t\t63\t1.17290410867693\t0.115381880483191\t0.918920868266012\n+M599T3741\t599.299987792969\t599.299987792969\t599.299987792969\t3741.10100087839\t3735.82337194686\t3746.37862980992\t2\t1\t1\t\t\t1025\t1.28970384870994\t-0.178016131518077\t0.87605328155016\n+M599T3433\t599.299987792969\t599.299987792969\t599.299987792969\t3433.26624059939\t3433.26624059939\t3433.26624059939\t1\t1\t0\t\t\t4884\t4.93777942448826\t-0.840632123084489\t0.544862077556411\n+M599T4127\t599.299987792969\t599.299987792969\t599.299987792969\t4126.89956529202\t4126.89956529202\t4126.89956529202\t1\t0\t1\t\t[M-H+NaCOOH]- 532.325\t23\t1.0841231669298\t0.0840863294693396\t0.942480191266044\n+M599T3728\t599.400024414062\t599.400024414062\t599.400024414062\t3727.93766242873\t3727.93766242873\t3727.93766242873\t1\t0\t1\t\t\t3590\t8.55809091667057\t0.877183469531961\t0.538430859645099\n+M599T4125\t599.400024414062\t599.400024414062\t599.400024414062\t4125.3114579078\t4125.3114579078\t4125.3114579078\t1\t1\t0\t\t\t1517\t1.3760664587884\t-0.235040198509613\t0.839694750291835\n+M599T2844\t599.400024414062\t599.400024414062\t599.400024414062\t2844.03291905224\t2844.03291905224\t2844.03291905224\t1\t1\t0\t\t\t5535\t1.94813261160072\t-0.485317468025549\t0.711632461795722\n+M599T2970\t599.400024414062\t599.400024414062\t599.400024414062\t2969.89649835987\t2969.89649835987\t2969.89649835987\t1\t0\t1\t\t\t3287\t1.28369928557392\t-0.283602299449437\t0.824023298371347\n+M599T3812\t599.400024414062\t599.400024414062\t599.400024414062\t3812.23153189745\t3812.23153189745\t3812.23153189745\t1\t1\t0\t\t\t2402\t4.36821098980058\t-0.999245621681714\t0.483251011195392\n+M600T2728\t599.5\t599.5\t599.5\t2728.06725194668\t2728.06725194668\t2728.06725194668\t1\t0\t1\t\t\t2541\tInf\t1\t0.5\n+M600T3605\t599.5\t599.5\t599.5\t3604.78487735047\t3604.78487735047\t3604.78487735047\t1\t0\t1\t\t\t1463\tInf\t1\t0.5\n+M600T3410\t599.5\t599.5\t599.5\t3409.6137638498\t3409.6137638498\t3409.6137638498\t1\t1\t0\t\t\t2557\tInf\t-1\t0.5\n+M600T3002\t599.5\t599.5\t599.5\t3001.73340037252\t3001.73340037252\t3001.73340037252\t1\t1\t0\t\t\t4097\tInf\t-1\t0.5\n+M600T2526\t599.799987792969\t599.799987792969\t599.799987792969\t2525.60208488001\t2525.60208488001\t2525.60208488001\t1\t0\t1\t\t\t5966\tInf\t1\t0.5\n+M600T2559\t599.799987792969\t599.799987792969\t599.799987792969\t2559.03497459635\t2559.03497459635\t2559.03497459635\t1\t1\t0\t\t\t3097\tInf\t-1\t0.5\n+M600T2605\t599.900024414062\t599.900024414062\t599.900024414062\t2604.63847751491\t2599.870668269\t2609.40628676082\t2\t1\t1\t\t\t5240\t2.92442802298341\t-0.784160705393036\t0.544781690982514\n+M600T2778\t599.900024414062\t599.900024414062\t599.900024414062\t2777.62270382815\t2777.62270382815\t2777.62270382815\t1\t0\t1\t\t\t4269\tInf\t1\t0.5\n+M600T3440\t600\t600\t600\t3440.21498381355\t3440.21498381355\t3440.21498381355\t1\t1\t0\t\t\t2940\tInf\t-1\t0.5\n+M600T3074\t600\t600\t600\t3073.93667972513\t3073.93667972513\t3073.93667972513\t1\t0\t1\t\t\t2446\t1.36873373980727\t0.217526620333269\t0.849603759563344\n+M600T2840\t600\t600\t600\t2840.34223529104\t2840.34223529104\t2840.34223529104\t1\t0\t1\t\t\t4643\tInf\t1\t0.5\n+M600T3456\t600\t600\t600\t3455.56264424004\t3455.56264424004\t3455.56264424004\t1\t1\t0\t\t\t1301\t3.43822018687183\t-0.680935393339883\t0.605619546160086\n+M600T3351\t600\t600\t600\t3350.85695421667\t3350.85695421667\t3350.85695421667\t1\t1\t0\t\t\t688\tInf\t-1\t0.5\n+M600T2539\t600\t600\t600\t2538.69097459635\t2538.69097459635\t2538.69097459635\t1\t1\t0\t\t\t5560\t2.67669683359966\t-0.586792116233081\t0.644186443362018\n+M600T3208\t600\t600\t600\t3208.3511612646\t3208.3511612646\t3208.3511612646\t1\t1\t0\t\t\t4342\t4.3596289819114\t-0.990898619184961\t0.481024727063404\n+M600T2969\t600\t600\t600\t2969.47546024467\t2969.47546024467\t2969.47546024467\t1\t1\t0\t\t\t72\t1.72326301741792\t-0.363011971451661\t0.758693604731551\n' |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/faahKO.xset.group.retcor.group.fillpeaks.RData |
b |
Binary file test-data/faahKO.xset.group.retcor.group.fillpeaks.RData has changed |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/faahKO_reduce.zip |
b |
Binary file test-data/faahKO_reduce.zip has changed |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/xset.group.retcor.group.fillPeaks.RData |
b |
Binary file test-data/xset.group.retcor.group.fillPeaks.RData has changed |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv --- a/test-data/xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv Mon Feb 22 16:48:11 2016 -0500 +++ /dev/null Thu Jan 01 00:00:00 1970 +0000 |
b |
b'@@ -1,10502 +0,0 @@\n-name\tHU_neg_028\tHU_neg_060\tHU_neg_051\tHU_neg_017\tHU_neg_034\tBlanc09\tBlanc06\tBlanc12\tBlanc04\n-M1000T512\t0\t0\t0\t0\t0\t0\t5036.82852265629\t0\t6474.210230664\n-M100T1000\t0\t0\t0\t0\t0\t0\t4599.08329817705\t2702.43283984368\t0\n-M100T2\t5811.08552812497\t0\t0\t0\t5375.66902425136\t0\t0\t0\t0\n-M100T293\t0\t2482.38425761909\t4219.51972607428\t4427.18366943356\t0\t0\t0\t0\t0\n-M100T298\t4890.97091357427\t0\t0\t4715.26977083327\t0\t0\t0\t0\t0\n-M100T314\t0\t0\t4224.19688313797\t4613.46712239577\t0\t0\t0\t0\t0\n-M100T319\t0\t6084.19628173824\t0\t0\t5340.93520686855\t0\t0\t0\t0\n-M100T331\t0\t20313.3569121093\t3817.66032625328\t0\t0\t0\t0\t0\t0\n-M100T333\t0\t0\t0\t0\t0\t5570.61146484404\t0\t0\t7789.14413452137\n-M100T347\t0\t6020.55854654954\t0\t0\t9213.46826835946\t0\t0\t0\t0\n-M100T375\t0\t7337.7590898437\t0\t4761.05562825524\t0\t0\t0\t0\t0\n-M100T416\t0\t0\t0\t0\t0\t0\t4173.99242626954\t0\t10968.3919889323\n-M100T426\t4970.30537109381\t0\t0\t0\t5381.89123291013\t2643.08791874353\t0\t2062.73527699962\t0\n-M100T432\t0\t0\t0\t4409.6550625\t4876.56194010423\t0\t0\t0\t0\n-M100T440\t9068.88897949213\t0\t9000.99983535161\t0\t0\t0\t0\t0\t0\n-M100T452\t0\t0\t0\t7224.16407747387\t6213.12908398434\t0\t0\t0\t0\n-M100T461\t18531.4635908206\t0\t0\t12110.4099086216\t0\t7953.07081713872\t0\t2434.37583496094\t4039.84540663579\n-M100T493\t5665.63905000003\t0\t0\t4702.05147656251\t0\t9361.02869091804\t0\t0\t0\n-M100T508\t7592.74518880218\t8289.71548154314\t0\t0\t3496.24417561429\t2938.4074615447\t0\t1644.36067568233\t0\n-M100T53\t5850.47663126954\t5929.48877718752\t0\t0\t0\t2288.52324384894\t0\t1276.10773271032\t0\n-M101T100\t4835.62484586594\t0\t4793.95766113283\t0\t0\t0\t1945.74213497314\t0\t4225.31419124346\n-M101T1015\t3840.65858837885\t0\t5893.74248925778\t0\t5107.60767968749\t0\t0\t0\t0\n-M101T1018\t0\t5357.21749348955\t3643.54618164065\t0\t0\t0\t0\t0\t0\n-M101T1063\t0\t14617.8453750002\t7703.18314648434\t0\t0\t0\t0\t0\t0\n-M101T1081\t0\t0\t0\t0\t1613.6872342961\t0\t0\t2288.45194848628\t6462.56716875005\n-M101T1101\t0\t0\t0\t0\t0\t6028.10051879881\t0\t3010.59207324218\t0\n-M101T185\t0\t0\t0\t0\t0\t0\t4300.05537597656\t0\t7834.34331435533\n-M101T19\t0\t0\t0\t10941.0464583333\t5898.97488749992\t0\t0\t0\t4320.89661458339\n-M101T203\t0\t0\t4869.82927978514\t0\t5017.54216406256\t0\t0\t0\t0\n-M101T234\t0\t0\t6894.57485283199\t6068.44515917976\t0\t0\t3043.48486479432\t1510.81441321336\t2513.88177411688\n-M101T266\t0\t0\t0\t0\t0\t0\t4507.999384375\t0\t4380.82375390619\n-M101T277\t0\t0\t14647.3111767577\t7499.78505878913\t0\t0\t2714.20046554574\t0\t0\n-M101T288\t9180.25649687506\t0\t0\t0\t6063.40918212892\t0\t0\t2399.91459326177\t0\n-M101T304\t0\t0\t3884.95764062502\t5012.23335937496\t0\t0\t0\t0\t0\n-M101T309\t0\t0\t7266.6919523438\t4824.00243880202\t0\t3107.38567199708\t0\t0\t0\n-M101T311\t0\t0\t5954.61004277346\t6327.82162353521\t0\t0\t0\t0\t0\n-M101T316\t0\t5306.16300520826\t7823.74141230461\t0\t0\t0\t3177.41424187955\t0\t0\n-M101T318\t0\t0\t0\t0\t0\t0\t0\t3185.18147070316\t5892.18683227537\n-M101T337\t4915.73952962238\t4648.49991582034\t0\t0\t0\t0\t0\t0\t0\n-M101T345\t2846.14128701836\t7489.62993425286\t2695.22316777656\t0\t7348.17281067861\t18238.9821067116\t0\t4448.60404895026\t0\n-M101T347\t5807.5765048828\t2324.73412763612\t5052.2109375\t0\t12714.2984707029\t11694.0505023438\t7421.29375195315\t0\t0\n-M101T357\t0\t0\t2682.73092314526\t0\t13437.9621060267\t9783.18790380861\t0\t0\t16415.0986192802\n-M101T363\t0\t0\t2713.80915064533\t5119.67926640617\t14101.1374375003\t10464.4584999998\t0\t0\t8440.09923632815\n-M101T373\t0\t0\t0\t0\t0\t10244.7450773438\t2099.43836696947\t0\t9804.77246716304\n-M101T38\t0\t3146.68744132522\t0\t0\t0\t17875.1039691683\t5547.39166406246\t0\t0\n-M101T407\t13302.4858305664\t14500.1648874241\t0\t0\t0\t0\t0\t0\t0\n-M101T407\t0\t15671.4244984375\t4864.32637413424\t0\t5428.11071442998\t0\t9299.00803242179\t0\t12967.5716172849\n-M101T415\t0\t26791.5702578127\t16065.3440327963\t0\t0\t0\t13917.0983048827\t0\t2896.80860943604\n-M101T422\t0\t64849.9774400107\t16013.8197011717\t0\t0\t0\t0\t0\t2819.02709963931\n-M101T425\t0\t8086.68794091804\t12613.135213623\t0\t0\t0\t2120.86015101204\t0\t0\n-M101T431\t0\t0\t5795.9915526217\t0\t0\t3984.47559179684\t0\t0\t9549.68881328111\n-M101T448\t0\t11835.0301676432\t0\t0\t0\t3326.27429003905\t0\t0\t14236.3865019532\n-M101T455\t0\t0\t0\t0\t1476.29952417916\t3553.19585156248\t0\t0\t11987.281216406\n-M101T462\t0\t0\t4378.73567812496\t0\t5507.61291992185\t0\t0\t0\t0\n-M101T468\t3815.9655094087\t0\t0\t15581.0'..b'\n-M98T298\t12033.7990023623\t0\t10095.9059480946\t20355.102090791\t16738.635815625\t18398.4912115479\t10682.3062182592\t2161.71837984225\t4194.64797040555\n-M98T331\t43250.2919921878\t0\t7054.8470610895\t33829.0457144534\t12505.6193204733\t0\t18987.4640001309\t18819.7916297434\t15901.0293009531\n-M98T351\t46441.3032150716\t6485.38601209015\t5001.45866421657\t0\t39889.1078736979\t0\t0\t0\t0\n-M98T367\t7001.76789760335\t0\t0\t33887.2226204427\t16599.9671304689\t5933.3685692007\t4614.93629139585\t0\t11505.6987889408\n-M98T367\t40351.8855537541\t38408.516039258\t7147.03723400343\t19824.8030509767\t48596.6357477217\t0\t10728.8855659358\t12784.4137019367\t0\n-M98T380\t65715.5035685769\t165406.305133929\t11105.2569936221\t76798.2240136723\t0\t20387.7668162112\t24957.8049654044\t5089.34647558595\t24076.0965404875\n-M98T389\t40110.3708352049\t0\t0\t6589.46146379816\t63779.6080958254\t0\t21504.6724656537\t0\t0\n-M98T394\t6275.85635038641\t0\t3993.03044733438\t0\t4517.77701811688\t0\t6449.3886100969\t6347.72846411128\t34057.3108268228\n-M98T397\t16207.2535708029\t8660.78758257143\t33769.0400229483\t0\t26368.7877760418\t0\t0\t0\t17112.2280698007\n-M98T404\t0\t23049.8922851559\t26151.5462304678\t0\t6846.67831537481\t22571.7217597666\t11984.1825383045\t0\t36862.981119794\n-M98T407\t19347.9872890119\t46373.497864063\t25676.233371745\t0\t51507.288565104\t0\t7490.79599112671\t0\t28169.4216720701\n-M98T414\t18579.270410605\t35616.7884895838\t0\t0\t5473.78673066251\t6248.61256244348\t23720.7412847654\t3242.7054212409\t20756.7786035156\n-M98T438\t0\t0\t15803.218760957\t3445.96259140164\t27644.9059549562\t0\t6590.7921675881\t0\t30674.1969420573\n-M98T447\t0\t0\t0\t26664.8981588545\t38136.9950055809\t6168.86382797603\t6730.69390584595\t1609.78424469811\t45994.4884648437\n-M98T481\t8960.80244556582\t5759.9098104663\t14095.837158203\t36699.0353473295\t35862.0692626951\t0\t0\t0\t0\n-M98T483\t0\t0\t14186.2835488281\t0\t0\t0\t24951.1946264651\t0\t25989.2253148439\n-M98T499\t0\t0\t18734.8299023431\t24706.1264785154\t0\t7980.36027636752\t25526.5399999995\t0\t13676.0945875036\n-M98T516\t0\t33273.5325015621\t0\t57937.6488264514\t18677.3012027343\t0\t8544.26490406456\t0\t29236.7671376953\n-M98T526\t0\t0\t0\t6999.65880292927\t34156.3999404296\t0\t25357.646195166\t0\t24265.9988387891\n-M98T532\t8617.12038594646\t0\t0\t44354.9626028183\t24774.2776831052\t0\t16266.4997957182\t0\t7374.57945879994\n-M98T562\t0\t0\t0\t0\t0\t0\t26951.2787375979\t0\t34361.037970312\n-M98T61\t46855.1926076656\t33200.1969507807\t0\t0\t0\t0\t24447.9503554685\t0\t0\n-M98T78\t0\t0\t0\t14133.8399008145\t0\t0\t41591.8464933268\t0\t27672.7922421871\n-M98T95\t0\t0\t27861.7014316423\t0\t14974.8642421874\t0\t12702.0770945877\t0\t0\n-M990T259\t11445.4300339846\t0\t0\t0\t53657.0197828124\t0\t7818.8102245619\t0\t15035.0051865234\n-M990T343\t0\t0\t0\t0\t0\t0\t20123.4810992191\t0\t25490.8785742187\n-M990T369\t0\t0\t0\t7057.84821859902\t0\t0\t0\t4457.24975561523\t16898.6011645508\n-M993T348\t0\t0\t0\t0\t0\t0\t59661.9339383139\t0\t30085.410102344\n-M997T383\t0\t0\t0\t0\t4460.17117395853\t0\t20565.8404687498\t0\t29578.9814318031\n-M99T1003\t0\t0\t0\t0\t21765.0056250002\t0\t8938.02282187495\t0\t17387.7045474608\n-M99T298\t0\t5664.44523602134\t0\t0\t0\t0\t5094.69390494785\t3310.26129199218\t0\n-M99T318\t0\t15693.1810728906\t15540.1450017415\t0\t0\t0\t0\t0\t0\n-M99T353\t0\t32044.3518995361\t21076.9573776693\t0\t0\t0\t0\t0\t0\n-M99T367\t0\t0\t17905.8622833986\t0\t8149.6888910157\t0\t0\t0\t0\n-M99T374\t9815.817381836\t0\t44245.4081604348\t0\t0\t0\t0\t0\t0\n-M99T395\t0\t16013.6476999516\t17044.3422705077\t0\t0\t0\t0\t0\t0\n-M99T400\t0\t45724.0838046875\t36411.3441500004\t0\t0\t0\t0\t0\t0\n-M99T409\t0\t44920.0833999022\t15126.6836962889\t0\t0\t0\t0\t0\t0\n-M99T445\t0\t12236.9935078124\t0\t0\t43625.0513101811\t0\t0\t0\t0\n-M99T445\t0\t0\t0\t35022.873751255\t34970.684082812\t0\t0\t0\t0\n-M99T456\t0\t0\t3576.30531184902\t0\t15059.7528710939\t0\t4008.28924160843\t0\t0\n-M99T459\t8921.50150748704\t0\t0\t27630.8207610678\t0\t0\t0\t0\t0\n-M99T466\t0\t0\t5483.2118649089\t31885.6731552737\t0\t0\t0\t0\t0\n-M99T477\t0\t0\t0\t0\t0\t2099.72171832276\t0\t0\t3605.64380859373\n-M99T485\t47564.5672546388\t0\t0\t0\t23523.7730712891\t0\t0\t0\t0\n-M99T518\t55650.3042304689\t0\t0\t0\t14186.5196855469\t0\t0\t0\t0\n-M99T532\t0\t0\t8729.03967187495\t8428.00684895823\t0\t0\t0\t0\t0\n-M99T540\t9016.81602669254\t0\t0\t6329.61919759112\t0\t0\t0\t0\t0\n-M99T61\t0\t0\t0\t0\t0\t5391.6712458983\t3200.05871419267\t0\t0\n' |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/xset.group.retcor.group.fillPeaks.annotate.negative.Rdata |
b |
Binary file test-data/xset.group.retcor.group.fillPeaks.annotate.negative.Rdata has changed |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/xset.group.retcor.group.fillPeaks.annotate.variableMetadata.Xdiffreport.zip |
b |
Binary file test-data/xset.group.retcor.group.fillPeaks.annotate.variableMetadata.Xdiffreport.zip has changed |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 test-data/xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv --- a/test-data/xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv Mon Feb 22 16:48:11 2016 -0500 +++ /dev/null Thu Jan 01 00:00:00 1970 +0000 |
b |
b'@@ -1,10502 +0,0 @@\n-name\tmz\tmzmin\tmzmax\trt\trtmin\trtmax\tnpeaks\tbio\tblank\tisotopes\tadduct\tpcgroup\tfold\ttstat\tpvalue\n-M1000T512\t999.624765742559\t999.622822500743\t999.626708984375\t511.815480660665\t511.172060519346\t512.458900801983\t2\t0\t2\t\t\t7405\tInf\t1.62927854499044\t0.201743200431848\n-M100T1000\t99.9256935656133\t99.9256651267006\t99.9257324341632\t999.994565901246\t998.660274308172\t1000.92634598134\t4\t3\t1\t\t\t459\t1.16661952587314\t0.620010914103124\t0.560969348034051\n-M100T2\t100.003684541172\t100.003630125811\t100.003772038149\t2.37464509448837\t1.92957542883381\t11.6538615977562\t5\t3\t1\t\t\t3315\t2.68106972708365\t-2.18103553543849\t0.0859235409187575\n-M100T293\t100.003747500677\t100.003690006748\t100.003776732307\t293.188931920388\t293.070669572271\t294.475169416604\t5\t5\t0\t\t\t53\t78.8399923315323\t-3.688312132595\t0.0210486952188762\n-M100T298\t100.048227688733\t100.048157058085\t100.04829831938\t298.308873593555\t297.687933569501\t298.929813617609\t2\t2\t0\t\t\t7605\tInf\t-1.34779675479882\t0.248998206380447\n-M100T314\t100.003679434527\t100.003615927973\t100.003742941081\t314.282134527963\t313.872693140743\t314.691575915183\t2\t2\t0\t\t\t339\tInf\t-1.36624151076582\t0.243630615713256\n-M100T319\t100.048258178134\t100.048074196716\t100.048440952291\t318.787396735423\t318.501731377404\t319.790699552324\t4\t4\t0\t\t\t6\t80.7375052749587\t-2.22867494446313\t0.0896377277189235\n-M100T331\t100.307636260986\t100.306953430176\t100.308319091797\t331.4804141868\t326.630646275945\t336.330182097654\t2\t0\t2\t\t\t4189\tInf\t1.52478905748601\t0.224717198493427\n-M100T333\t99.7608703656017\t99.7579925622581\t99.7637481689453\t333.27937598949\t328.522653453703\t338.036098525276\t2\t2\t0\t\t\t2685\tInf\t-1.55778367320295\t0.194281864373894\n-M100T347\t99.7322692871094\t99.7315902709961\t99.7329483032227\t347.112349360752\t342.565685745434\t351.65901297607\t2\t2\t0\t\t\t1402\t5.49195148131386\t-1.22828326329905\t0.278065418206084\n-M100T375\t99.9116744995117\t99.9078979492188\t99.9154510498047\t374.860785017455\t373.962539445161\t375.759030589748\t2\t0\t2\t\t\t3326\tInf\t1.69857583233921\t0.187962460428964\n-M100T416\t100.00372172522\t100.00365957925\t100.003803624268\t416.0568841137\t415.262506940792\t416.574475136047\t5\t5\t0\t\t\t28\tInf\t-4.54477609473045\t0.0104590476421147\n-M100T426\t99.9210290857745\t99.9174213307287\t99.9246368408203\t425.548147463017\t422.888496555246\t428.207798370789\t2\t2\t0\t\t\t3176\tInf\t-1.53933812675696\t0.198557424872382\n-M100T432\t100.412147856883\t100.411201477051\t100.41682434082\t432.027957184044\t427.792565046625\t442.212382433692\t3\t1\t2\t\t\t5286\t2.06577644584236\t-0.602152345343107\t0.573111527472988\n-M100T440\t100.353652954102\t100.352266894696\t100.354827880859\t439.591194011324\t429.419961492527\t448.159492643756\t3\t2\t0\t\t\t5164\tInf\t-1.63048565241177\t0.178333037650961\n-M100T452\t100.003706948659\t100.003704687313\t100.003709210005\t452.292626269003\t452.23857580542\t452.346676732585\t2\t2\t0\t\t\t230\tInf\t-2.43458518414519\t0.0716255651165265\n-M100T461\t100.288031200315\t100.285741050532\t100.290321350098\t461.246553646129\t458.977056295441\t463.516050996818\t2\t2\t0\t\t\t4635\tInf\t-1.38789492583488\t0.237474672472332\n-M100T493\t100.086910247803\t100.086265563965\t100.087554931641\t492.771648218016\t488.040063802224\t497.503232633807\t2\t0\t2\t\t\t1691\tInf\t2.71582402373149\t0.0728054654782906\n-M100T508\t99.6787147521973\t99.6763153076172\t99.6811141967773\t508.424578538439\t506.162144895373\t510.687012181504\t2\t0\t2\t\t\t7495\tInf\t1.58474949850941\t0.211197394276275\n-M100T53\t100.003760634835\t100.00369627601\t100.003797132112\t53.2201329125331\t53.1482641301558\t60.0181506522776\t3\t2\t0\t\t\t2720\t1.1558621401133\t0.582324757142567\t0.579010829705869\n-M101T100\t100.887813568115\t100.884910583496\t100.890716552734\t99.7732948371266\t97.903782027717\t101.642807646536\t2\t0\t2\t\t\t4702\tInf\t1.61902309935848\t0.203877815129219\n-M101T1015\t100.824584960938\t100.817962646484\t100.825881958008\t1015.1271537676\t1011.41324684241\t1022.4458771806\t3\t0\t2\t\t\t6991\tInf\t1.72957118783039\t0.182146462153941\n-M101T1018\t100.95315708753\t100.953106676588\t100.96183013916\t1018.39517373376\t1011.77786795058\t1022.79581464402\t3\t0\t2\t\t\t8649\tInf\t1.54384294185936\t0.220319692315036\n-M101T1063\t100.823341369629\t'..b'577430272\t0.203112552058883\n-M990T343\t990.206422862944\t990.203270653044\t990.209575072844\t343.420366384495\t339.139086485813\t347.701646283176\t2\t2\t0\t\t\t7429\tInf\t-1.49657776278745\t0.208842777975643\n-M990T369\t990.219451943862\t990.219421465849\t990.219482421875\t369.487831193534\t364.857637193488\t374.11802519358\t2\t2\t0\t\t\t3954\tInf\t-1.29606172799456\t0.26467822531658\n-M993T348\t993.473480224609\t993.471923828125\t993.475036621094\t348.128643814224\t347.735718771342\t348.521568857107\t2\t2\t0\t\t\t1441\tInf\t-1.63257438884812\t0.177895413467508\n-M997T383\t996.978668212891\t996.978332519531\t996.97900390625\t383.471786718893\t379.898758201512\t387.044815236275\t2\t2\t0\t\t\t4378\tInf\t-1.59280298760064\t0.186423166268503\n-M99T1003\t98.9066308209657\t98.9057051975035\t98.9067926456026\t1003.33537037037\t1003.2025\t1003.38625\t3\t0\t3\t\t\t2214\t3.14294807969468\t3.73575276970551\t0.00800404417189471\n-M99T298\t99.0448436256919\t99.0448187864457\t99.0448902933873\t297.687933569501\t297.283674019669\t298.929813617609\t5\t5\t0\t\t\t257\tInf\t-2.42356528044272\t0.0724831161929949\n-M99T318\t99.0449029000333\t99.0448487107835\t99.0450721109512\t318.112034691191\t311.582219672708\t323.41889684579\t10\t5\t0\t\t\t107\tInf\t-3.21524392709653\t0.0324267632557853\n-M99T353\t98.6059885865031\t98.6032125245686\t98.6087646484375\t353.30299975001\t349.179440872781\t357.426558627239\t2\t0\t2\t\t\t2462\tInf\t1.53654116563059\t0.221993550746013\n-M99T367\t99.104808807373\t99.1045074462891\t99.105110168457\t366.580883371834\t361.246165075267\t371.915601668401\t2\t2\t0\t\t\t2921\tInf\t-1.63217625965127\t0.17797874167437\n-M99T374\t99.243236541748\t99.2430648803711\t99.243408203125\t373.5381418881\t369.384775761638\t377.691508014562\t2\t0\t2\t\t\t5219\tInf\t1.68035915408935\t0.191479028911014\n-M99T395\t98.7073707580566\t98.7034149169922\t98.7113265991211\t394.775435011762\t391.392495271647\t398.158374751877\t2\t0\t2\t\t\t2056\tInf\t1.72519944143576\t0.182954226295366\n-M99T400\t99.4992666196488\t99.4975891113281\t99.5009441279694\t399.530242289027\t396.446086388875\t402.614398189179\t2\t0\t2\t\t\t3504\tInf\t2.13200437964979\t0.122778001922234\n-M99T409\t98.7325973510742\t98.7320556640625\t98.7389144897461\t409.063414775655\t408.335856586534\t419.077723332698\t3\t2\t1\t\t\t1759\t2.24987880146676\t-0.732846869274591\t0.488136522730201\n-M99T445\t99.1642456054688\t99.1623229980469\t99.1661682128906\t444.841274493604\t441.261790909576\t448.420758077631\t2\t2\t0\t\t\t7324\tInf\t-1.57573951260102\t0.19021061912884\n-M99T445\t99.2542351945541\t99.2538393466278\t99.2546310424805\t445.15517460177\t441.052517073082\t449.257832130457\t2\t2\t0\t\t\t297\tInf\t-1.43881880578411\t0.223599285280575\n-M99T456\t99.2163467407227\t99.2115173339844\t99.2166562361497\t455.648189141701\t449.794626354296\t457.43081106248\t3\t2\t1\t\t\t3009\t3.98153225512643\t-0.988297076327512\t0.368840541430864\n-M99T459\t99.3568725585938\t99.3529815673828\t99.3607635498047\t458.871632035626\t455.770867554041\t461.972396517212\t2\t2\t0\t\t\t601\tInf\t-1.55047780273486\t0.195963911784168\n-M99T466\t98.54681273324\t98.5441284179688\t98.5494970485113\t465.977019543389\t462.237197996784\t469.716841089993\t2\t0\t2\t\t\t670\tInf\t2.08192970680607\t0.128764981078394\n-M99T477\t98.885627746582\t98.8834915161133\t98.8899307250977\t476.553478749374\t476.398428449732\t481.296076228992\t3\t2\t1\t\t\t5882\t3.09453407912689\t-0.976742668771266\t0.366890654916147\n-M99T485\t99.0654983520508\t99.0629043579102\t99.0680923461914\t484.503516164147\t481.258056516056\t487.748975812239\t2\t0\t2\t\t\t4450\tInf\t1.65394454163613\t0.196711272102276\n-M99T518\t98.8607618840303\t98.8593902587891\t98.8621335092716\t518.445283176274\t515.803877186145\t521.086689166404\t2\t2\t0\t\t\t4673\tInf\t-1.48976677302237\t0.210530412706878\n-M99T532\t98.5846786499023\t98.5837097167969\t98.5856475830078\t531.789825395774\t526.508049692561\t537.071601098986\t2\t2\t0\t\t\t8962\tInf\t-1.62934123359675\t0.178573286990708\n-M99T540\t98.5634422302246\t98.5602340698242\t98.566650390625\t539.808083447028\t537.228989607772\t542.387177286284\t2\t2\t0\t\t\t798\tInf\t-1.45312901445603\t0.219848100996007\n-M99T61\t98.9555595192691\t98.9554203289135\t98.9590278194966\t60.5444205123284\t48.0328368453438\t77.1960803122144\t15\t5\t1\t\t\t2597\t203.432997864313\t-5.93938762972869\t0.00402557203229015\n' |
b |
diff -r 8c5bb7b86df9 -r 7da9252dd983 tool_dependencies.xml --- a/tool_dependencies.xml Mon Feb 22 16:48:11 2016 -0500 +++ b/tool_dependencies.xml Mon Apr 25 11:06:25 2016 -0400 |
b |
@@ -1,15 +1,12 @@ <?xml version="1.0"?> <tool_dependency> <package name="R" version="3.1.2"> - <repository changeset_revision="c987143177d4" name="package_r_3_1_2" owner="iuc" toolshed="https://toolshed.g2.bx.psu.edu" /> - </package> - <package name="camera" version="1.22.0"> - <repository changeset_revision="845eb883bd1b" name="package_r_camera_1_22_0" owner="lecorguille" toolshed="https://toolshed.g2.bx.psu.edu" /> + <repository changeset_revision="4d2fd1413b56" name="package_r_3_1_2" owner="iuc" toolshed="https://toolshed.g2.bx.psu.edu" /> </package> - <package name="camera_w4m_script" version="2.2.1"> - <repository changeset_revision="91b0d23c9d52" name="package_camera_w4m_script_2_2_1" owner="lecorguille" toolshed="https://toolshed.g2.bx.psu.edu" /> + <package name="bioconductor-camera" version="1.26.0"> + <repository changeset_revision="fd308c76626b" name="package_bioconductor_camera_1_26_0" owner="lecorguille" toolshed="https://toolshed.g2.bx.psu.edu" /> </package> - <package name="graphicsmagick" version="1.3.18"> - <repository changeset_revision="ef238a8bdc1d" name="package_graphicsmagick_1_3" owner="iuc" toolshed="https://toolshed.g2.bx.psu.edu" /> + <package name="graphicsmagick" version="1.3.20"> + <repository changeset_revision="f2855f4cbc8f" name="package_graphicsmagick_1_3_20" owner="iuc" toolshed="https://toolshed.g2.bx.psu.edu" /> </package> </tool_dependency> |