[BioC] edgeR question (reading tab delimited files)
Gordon K Smyth
smyth at wehi.EDU.AU
Mon Dec 16 00:27:43 CET 2013
Hi Audra,
Have you tried following the examples in Sections 4.1 and 4.2 of the edgeR
User's Guide?
However you will probably need to learn more about R itself to be
comfortable, as Sam McInturf has noted in his reply.
Best wishes
Gordon
> Date: Sat, 14 Dec 2013 18:51:08 -0800 (PST)
> From: "Audra [guest]" <guest at bioconductor.org>
> To: bioconductor at r-project.org, audra.loy at mavs.uta.edu
> Subject: [BioC] edgeR question
>
>
> Hi,
>
> I am learning Edge R and am having trouble importing data. I have to tab delimited files, each of two different time points I am trying to look at. How do I input these data into the edgeR program so that I can see the matrix? I hope this question makes sense.
>
> Audra
>
> -- output of sessionInfo():
>
>> sessionInfo
> function (package = NULL)
> {
> z <- list()
> z$R.version <- R.Version()
> z$platform <- z$R.version$platform
> if (nzchar(.Platform$r_arch))
> z$platform <- paste(z$platform, .Platform$r_arch, sep = "/")
> z$platform <- paste0(z$platform, " (", 8 * .Machine$sizeof.pointer,
> "-bit)")
> z$locale <- Sys.getlocale()
> if (is.null(package)) {
> package <- grep("^package:", search(), value = TRUE)
> keep <- sapply(package, function(x) x == "package:base" ||
> !is.null(attr(as.environment(x), "path")))
> package <- sub("^package:", "", package[keep])
> }
> pkgDesc <- lapply(package, packageDescription, encoding = NA)
> if (length(package) == 0)
> stop("no valid packages were specified")
> basePkgs <- sapply(pkgDesc, function(x) !is.null(x$Priority) &&
> x$Priority == "base")
> z$basePkgs <- package[basePkgs]
> if (any(!basePkgs)) {
> z$otherPkgs <- pkgDesc[!basePkgs]
> names(z$otherPkgs) <- package[!basePkgs]
> }
> loadedOnly <- loadedNamespaces()
> loadedOnly <- loadedOnly[!(loadedOnly %in% package)]
> if (length(loadedOnly)) {
> names(loadedOnly) <- loadedOnly
> pkgDesc <- c(pkgDesc, lapply(loadedOnly, packageDescription))
> z$loadedOnly <- pkgDesc[loadedOnly]
> }
> class(z) <- "sessionInfo"
> z
> }
> <bytecode: 0x10328e4e0>
> <environment: namespace:utils>
>>
>
>
> --
> Sent via the guest posting facility at bioconductor.org.
______________________________________________________________________
The information in this email is confidential and intend...{{dropped:4}}
More information about the Bioconductor
mailing list