Skip to content

Commit

Permalink
Merge pull request #40 from statistikat/rm_vim_gui
Browse files Browse the repository at this point in the history
remove exports for VIMGUI
  • Loading branch information
alexkowa committed Apr 19, 2020
2 parents 380832c + e32ab7b commit 0cac771
Show file tree
Hide file tree
Showing 4 changed files with 1 addition and 117 deletions.
5 changes: 0 additions & 5 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -73,9 +73,7 @@ export(colormapMissLegend)
export(countInf)
export(countNA)
export(evaluation)
export(existsVm)
export(gapMiss)
export(getVm)
export(gowerD)
export(growdotMiss)
export(histMiss)
Expand All @@ -98,17 +96,14 @@ export(parcoordMiss)
export(pbox)
export(pfc)
export(prepare)
export(putVm)
export(rangerImpute)
export(regressionImp)
export(rmVm)
export(rugNA)
export(sampleCat)
export(scattJitt)
export(scattMiss)
export(scattmatrixMiss)
export(spineMiss)
export(vmGUIenvir)
import(MASS)
import(Rcpp)
import(colorspace)
Expand Down
8 changes: 0 additions & 8 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -143,14 +143,6 @@ is.continuous <- function(x) is.numeric(x) && !is.integer(x)

## utilities for plots

# get plot annotation for variables
getLabel <- function(v) {
sc <- switch(getVm("scaling"), none="", classical="scaled",
MCD="robustly scaled", robust="robustly scaled")
if(nchar(sc)) paste(v, " (", sc, ")", sep="")
else v
}

# print out which variables are highlighted
highlightInfo <- function(highlight, selection = c("any","all"), imputed = FALSE) {
if(!imputed) label <- "missings"
Expand Down
56 changes: 1 addition & 55 deletions R/zzz.R
Original file line number Diff line number Diff line change
@@ -1,58 +1,4 @@
#' Environment for the GUI for Visualization and Imputation of Missing Values
#'
#' Location were everything from package VIM and VIMGUI is stored.
#'
#' Internal information regarding the VIM GUI is stored in the environment
#' `vmGUIenvir`.
#'
#' @aliases vmGUIenvir putVm getVm existsVm rmVm
#' @param x object name
#' @param value value to be assigned to x
#' @param mode see 'exists'
#' @param ... see 'rm'
#' @author Andreas Alfons, based on an initial design by Matthias Templ,
#' modifications by Bernd Prantner
#' @references M. Templ, A. Alfons, P. Filzmoser (2012) Exploring incomplete
#' data using visualization tools. *Journal of Advances in Data Analysis
#' and Classification*, Online first. DOI: 10.1007/s11634-011-0102-y.
#' @keywords multivariate hplot
#' @rdname vmGUIenvir
#' @export vmGUIenvir
vmGUIenvir <- new.env()
.onAttach <- function(libname, pkgname) {
packageStartupMessage("VIM is ready to use. \n Since version 4.0.0 the GUI is in its own package VIMGUI.\n
Please use the package to use the new (and old) GUI.\n")
packageStartupMessage("VIM is ready to use.\n")
packageStartupMessage("Suggestions and bug-reports can be submitted at: https://github.com/statistikat/VIM/issues")
}

## utility functions for GUI environment

# access vmGUIenv
vmGUIenv <- function() {
get("vmGUIenvir", envir=as.environment("package:VIM"))
}
# put in vmGUIenv
#' @rdname vmGUIenvir
#' @export putVm
putVm <- function(x, value) {
assign(x, value, envir=vmGUIenv())
}
# put in vmGUIenv
#' @rdname vmGUIenvir
#' @export getVm
getVm <- function (x, mode="any") {
get(x, envir=vmGUIenv(), mode=mode, inherits=FALSE)
}
#' @rdname vmGUIenvir
#' @export existsVm
# does object exist in vmGUIenv?
existsVm <- function (x, mode="any") {
exists(x, envir=vmGUIenv(), mode=mode, inherits=FALSE)
}

#' @rdname vmGUIenvir
#' @export rmVm
rmVm <- function(...) {
localRm <- function(..., envir) rm(..., envir=vmGUIenv())
localRm(...)
}
49 changes: 0 additions & 49 deletions man/vmGUIenvir.Rd

This file was deleted.

0 comments on commit 0cac771

Please sign in to comment.