Skip to content

Commit

Permalink
Removed unused function and some comment lines.
Browse files Browse the repository at this point in the history
  • Loading branch information
sdgamboa committed Feb 1, 2024
1 parent ca8a3e8 commit 1339325
Show file tree
Hide file tree
Showing 3 changed files with 5 additions and 58 deletions.
1 change: 0 additions & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,6 @@ export(check_valid_ncbi_ids)
export(fattyAcidComposition)
export(getTaxonSignatures)
export(importBugphyzz)
export(importVal)
export(makeSignatures)
export(physiologies)
export(showPhys)
Expand Down
43 changes: 5 additions & 38 deletions R/bugphyzz.R
Original file line number Diff line number Diff line change
Expand Up @@ -53,7 +53,11 @@ importBugphyzz <- function(
output <- purrr::map(output, ~ {
.x |>
dplyr::mutate(
Attribute = ifelse(.data$Attribute == "plant pathogenity", "plant pathogenicity", .data$Attribute)
Attribute = ifelse(
.data$Attribute == "plant pathogenity",
"plant pathogenicity",
.data$Attribute
)
)
})

Expand Down Expand Up @@ -187,27 +191,6 @@ getTaxonSignatures <- function(tax, bp, ...) {
return(output)
}



#' Import validation data
#'
#' \code{importValidation} impots the result of the 10-fold cross-validation.
#'
#' @return A data.frame.
#' @export
#'
#' @examples
#'
#' val <- importValidation()
#'
importVal <- function() {
url <- "https://raw.githubusercontent.com/waldronlab/taxPProValidation/main/validation_summary.tsv"
readr::read_tsv(url, show_col_types = FALSE) |>
dplyr::filter(.data$rank == "all")
}



# Non exported functions ----------------------------------------------------
.makeSignaturesDiscrete <- function(dat, tax_id_type = "NCBI_ID") {
dat |>
Expand All @@ -216,22 +199,6 @@ importVal <- function() {
) |>
{\(y) split(y, y$Attribute)}() |>
lapply(function(x) unique(x[[tax_id_type]]))
# if (all(dat$Attribute_group != dat$Attribute)) {
# output <- dat |>
# dplyr::mutate(
# Attribute = paste0("bugphyzz:", .data$Attribute_group, "|", .data$Attribute, "|", .data$Attribute_value)
# ) |>
# {\(y) split(y, y$Attribute)}() |>
# lapply(function(x) unique(x[[tax_id_type]]))
# } else {
# output <- dat |>
# dplyr::mutate(
# Attribute = paste0("bugphyzz:", .data$Attribute, "|", .data$Attribute_value)
# ) |>
# {\(y) split(y, y$Attribute)}() |>
# lapply(function(x) unique(x[[tax_id_type]]))
# }
# return(output)
}

.makeSignaturesNumeric <- function(
Expand Down
19 changes: 0 additions & 19 deletions man/importVal.Rd

This file was deleted.

0 comments on commit 1339325

Please sign in to comment.