Entering edit mode
countsTable <-read.csv("counts.csv", header = T, stringsAsFactors = FALSE)
head(countsTable)
sample_info <-read.table("sample.txt", header = T, stringsAsFactors = FALSE)
#rownames(countsTable) <-countsTable[,27902]
#countsTable <-countsTable[,1]
class(sample_info)
sample_info$Type <- as.factor(as.character(sample_info$Type))
library(DESeq2)
rownames(countsTable) <-countsTable[,1]
countsTable <-countsTable[,-1]
(dds<-DESeqDataSetFromMatrix(countsTable[,c(1:128)],colData = sample_info,design = ~Type))
i get this error
Error in DESeqDataSet(se, design = design, ignoreRank) :
some values in assay are negative
Cross-posted: https://www.biostars.org/p/9500079/