Dear Community,
I am reading a single cell file and processing it along with TSNE. Finally generation of loom files.
The commands that I am using to read file is :
loadSCE <- function(path){ sce <- scater::read10XResults(path) #sce <- normalize(sce) # Data normalization based on scran mitochondrialGenes <- as.character(rowData(sce)[startsWith(rowData(sce)$symbol, "mt-"),]$id) isSpike(sce, "mt") <- rownames(sce) %in% mitochondrialGenes sce <- calculateQCMetrics(sce, feature_controls = list( MT = isSpike(sce, "mt") )) } paths <- list.dirs(path = "/SampleData/TestData/", recursive = FALSE) for (i in 1:length(paths)) assign(paste0("sce_",i), loadSCE(paths[i])) sce=0 for (i in 1:length(paths)) sce[i]<-print(noquote(paste0("sce_",i))) t_list <- list() tlist <- mget(ls(pattern="sce\d+")) for(i in seq_along(t_list)) { metadata(t_list[[i]])["name"] <- paste0("iMates-",i) }
the output for one of variable is
> sce_1 class: SingleCellExperiment dim: 33694 5586 metadata(0): assays(1): counts rownames(33694): ENSG00000243485 ENSG00000237613 ... ENSG00000277475 ENSG00000268674 rowData names(11): id symbol ... total_counts log10_total_counts colnames(5586): AAACCTGAGAAGGTTT-1 AAACCTGAGCGTTCCG-1 ... TTTGTCATCGTCTGCT-1 TTTGTCATCGTTGCCT-1 colData names(30): dataset barcode ... pct_counts_MT is_cell_control reducedDimNames(0): spikeNames(1): mt
I guess the problem is here only. if i could fix it here, i.e., change gene id to gene symbol and save it back to object sce_1 the problem will be solved. Can anyoe help me in fixing this on a boxing day :(
Thank you
Hi Aaron,
The code that I have put in here is an old version. The new version (for new project) has the edits suggested by you.
However, here I am running into trouble with the code. The sce objects work fine (only I get warnings):
But when I put this in a loop for a number of sce objects I get error:
where sce is a list and contains
sce_1
sce_2
sce_3
Please help me in sorting this out.
Many thanks in advance.
Some of your SCE objects don't have row names, so
rownames(sce[i])
returnsNULL
, leading to the error message.