Browse code

Fixes NAMESPACE error

Ashastry2 authored on 28/10/2024 14:44:55
Showing 1 changed files

... ...
@@ -290,7 +290,7 @@ plotSCEHeatmap <- function(inSCE, useAssay = 'logcounts', useReducedDim = NULL,
290 290
    #colData(SCE) <- colData(SCE)[,c(aggregateCol),drop=FALSE] ##change
291 291
     
292 292
     temp_df<-as.data.frame(colData(SCE)[,c(aggregateCol),drop=FALSE]) %>% 
293
-      unite("new_colnames",1:ncol(.),sep = "_",remove = FALSE) %>% 
293
+      unite("new_colnames",1:ncol(.data),sep = "_",remove = FALSE) %>% 
294 294
       remove_rownames() %>% 
295 295
     #  mutate(aggregated_column = new_colnames) %>%
296 296
     #  dplyr::select(new_colnames, aggregated_column) %>%