Skip to content

Commit

Permalink
v1.1.0 Plotting functions now exported.
Browse files Browse the repository at this point in the history
  • Loading branch information
innesbre committed Mar 2, 2019
1 parent fe3a766 commit 9e90b7a
Show file tree
Hide file tree
Showing 29 changed files with 1,594 additions and 208 deletions.
17 changes: 17 additions & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -10,13 +10,30 @@ export(DEdist)
export(DEdistNN)
export(DEmarker)
export(DEneighb)
export(addCellMarkersToCGS)
export(dotplotDEgenes)
export(findKeyType)
export(getEmb)
export(getExpr)
export(getMD)
export(labelCellTypes)
export(map2symbol)
export(meanLogX)
export(plot_GEboxplot)
export(plot_clustSep)
export(plot_clusterGenes_DEgenes)
export(plot_clusterGenes_markers)
export(plot_clusterGenes_search)
export(plot_compareClusts)
export(plot_deDotplot)
export(plot_mdCompare)
export(plot_mdPerClust)
export(plot_sil)
export(plot_tsne)
export(rainbow2)
export(runShiny)
export(spreadLabels2)
export(tsne_labels)
exportClasses(sCVdata)
exportClasses(sCVparams)
exportMethods("ClustGeneStats<-")
Expand Down
344 changes: 263 additions & 81 deletions R/deTest.R

Large diffs are not rendered by default.

10 changes: 7 additions & 3 deletions R/helperFx.R
Original file line number Diff line number Diff line change
Expand Up @@ -85,6 +85,7 @@ cosineSim <- function(A,B) sum(A*B)/sqrt(sum(A^2)*sum(B^2))
#'
#' @seealso \code{\link{map2symbol}}
#'
#' @export

findKeyType <- function(nge,annotationDB) {
rownameKeytype <- "SYMBOL"
Expand Down Expand Up @@ -122,6 +123,7 @@ findKeyType <- function(nge,annotationDB) {
#' @seealso \code{\link{findKeyType}},\code{\link[AnnotationDbi]{mapIds}},
#' \code{\link{addCellMarkersToCGS}}, and \code{\link{labelCellTypes}}.
#'
#' @export

map2symbol <- function(nge,annotationDB,rownameKeytype) {
if (rownameKeytype != "SYMBOL") {
Expand Down Expand Up @@ -161,7 +163,8 @@ map2symbol <- function(nge,annotationDB,rownameKeytype) {
#'
#' @seealso \code{\link{findKeyType}}, \code{\link{map2symbol}}, and
#' \code{\link[AnnotationDbi]{mapIds}}.
#'
#'
#' @export

addCellMarkersToCGS <- function(sCV,cellMarkersU,cellMarkersS,symbolMap) {
if (is.null(ClustGeneStats(sCV))) {
Expand All @@ -186,7 +189,7 @@ addCellMarkersToCGS <- function(sCV,cellMarkersU,cellMarkersS,symbolMap) {
}


#' Add predicted cell type names to cluster labels
#' scClustViz helper fx: Add predicted cell type names to cluster labels
#'
#' A bare-bones method of predicting cell types from marker genes.
#'
Expand All @@ -203,7 +206,8 @@ addCellMarkersToCGS <- function(sCV,cellMarkersU,cellMarkersS,symbolMap) {
#' @return Returns the sCVdata object with an added attribute
#' '\code{ClusterNames}' to \code{Clusters(sCV)} containing the assigned cell
#' type names for each cluster.
#'
#'
#' @export

labelCellTypes <- function(sCV,cellMarkers,symbolMap) {
if (length(cellMarkers) < 1) {
Expand Down
Loading

0 comments on commit 9e90b7a

Please sign in to comment.