Hi, I am having a little trouble with R-Studio. It is not finding the function "DESeqDataSetFromMatrix". This is my line of commands:
countdata1 <- read.table("RawCounts_baseline_MRDPos_vs_MRDNeg.txt", row.names=1, header=T, check.names = F)
countdata1 <- as.matrix(countdata1)
storage.mode(countdata1) = "integer"
coldata <- read.table("coldata_baseline_MRDPos_vs_MRDNeg.txt", header=T, row.names=1, sep="\t")
**dds <- DESeqDataSetFromMatrix(countData = countdata1, colData = coldata, design = ~ MRD)**
dds <- dds[rowSums(counts(dds))>1, ]
dds <-estimateSizeFactors(dds)
idx <- rowSums(counts(dds, normalized=TRUE) >=1) >= 35
dds <- dds[idx,]
dds <- DESeq(dds)
I am using R-Studio v1.4.1717 Any suggestions? thanks, Jovanny
Thanks James, sorry for the missing info. This is actually my first time posting here and did not see the suggestion about putting all the code. Actually, I did start the package but I just realized that the package Biobase needs to be reinstalled
Also it would help in the future if you tagged the package you were trying to get help on. You tagged BiocVersion which has no impact on your issue. If you had tagged DESeq2 / DESeq the maintainers of those packages would also be notified.
(Hint based on James's answer: Did you do
library(DESeq2)
?)You are right, again, my fault. yes i did library (DESeq2) I can ask again tagging DEseq2 thanks, Jovanny
No problem. Just trying to make sure you get the attention of additional people that can help. Cheers