Skip to content

Commit

Permalink
debug
Browse files Browse the repository at this point in the history
  • Loading branch information
debsin committed Aug 29, 2019
1 parent b74d7b4 commit ca6f5ea
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 6 deletions.
2 changes: 0 additions & 2 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -21,11 +21,9 @@ import(SingleCellExperiment)
importFrom(DropletUtils,read10xCounts)
importFrom(Rcpp,sourceCpp)
importFrom(Rdpack,reprompt)
importFrom(SingleCellExperiment,"colData<-")
importFrom(SingleCellExperiment,"logcounts<-")
importFrom(SingleCellExperiment,"normcounts<-")
importFrom(SingleCellExperiment,"reducedDim<-")
importFrom(SingleCellExperiment,"rowData<-")
importFrom(SingleCellExperiment,SingleCellExperiment)
importFrom(SingleCellExperiment,colData)
importFrom(SingleCellExperiment,counts)
Expand Down
8 changes: 4 additions & 4 deletions R/merge.R
Original file line number Diff line number Diff line change
Expand Up @@ -8,7 +8,7 @@
#' @return A SingleCellExperiment object with an additional column named \code{Batch} in \code{colData} column.
#' The column stores the origin of the batch for each cell. The different batches are labeled in the order
#' as appearing in the input list.
#' @importFrom SingleCellExperiment rowData colData rowData<- colData<-
#' @importFrom SingleCellExperiment rowData colData
#' @export
#' @examples
#' library(SingleCellExperiment)
Expand All @@ -33,7 +33,7 @@ Merge<-function(objects, use.de.genes = TRUE){
merge_genes = list()

if(is.null(rowData(objects[[1]])$Symbol))
rowData(objects[[1]])$Symbol <- rownames(objects[[1]])
SummarizedExperiment::rowData(objects[[1]])$Symbol <- rownames(objects[[1]])

common_genes = rowData(objects[[1]])$Symbol
common_colData = names(colData(objects[[1]]))
Expand All @@ -42,8 +42,8 @@ Merge<-function(objects, use.de.genes = TRUE){
cat("\nProcesing Batch",i,"...\n")

if(is.null(rowData(objects[[i]])$Symbol))
rowData(objects[[i]])$Symbol <- rownames(objects[[i]])
rowData(objects[[i]])$ID <- rownames(objects[[i]])
SummarizedExperiment::rowData(objects[[i]])$Symbol <- rownames(objects[[i]])
SummarizedExperiment::rowData(objects[[i]])$ID <- rownames(objects[[i]])
rownames(objects[[i]]) = rowData(objects[[i]])$Symbol


Expand Down

0 comments on commit ca6f5ea

Please sign in to comment.