#' @title createAstralPlaneCF
#'
#' @description Function for reading data into the astralPlane format
#'
#' @param astral.tree file path to your tree
#'
#' @param cf.file.name prefix file name of the file for concordance factors
#'
#' @param outgroups a vector of outgroups to root the tree
#'
#' @param tip.length arbitrary value for the terminal tip lengths, Astral does not compute this
#'
#' @return an S4 Object of class astralPlane. The object is slotted and contains: 1. Sample names, 2. phylogenetic tree rooted, 3. node.data table of ASTRAL-III node data, 4. edge.data table of ASTRAL-III branch data. All these make ASTRAL-III output readable and easy to use in other functions, or to plot using the astralProjection function.
#'
#' @examples
#'
#' your.tree = ape::read.tree(file = "file-path-to-tree.tre")
#' astral.data = astralPlane(astral.tree = your.tree,
#' outgroups = c("species_one", "species_two"),
#' tip.length = 1)
#'
#' @export
createAstralPlaneCF = function(cf.file.name = NULL,
outgroups = NULL,
tip.length = 1) {
#cf.file.name = paste0(input.dir, "/", cf.files[x])
#outgroups = outgroup.taxa
if(is.null(outgroups) == TRUE){ stop("Please provide outgroups.") }
if(is.null(cf.file.name) == TRUE){ stop("Please provide cf.file.name") }
#Reads in tree
astral.tree.name = paste0(cf.file.name, ".cf.branch")
#Check if files exist or not
if (file.exists(astral.tree.name) == F){
return(paste0("Concordance factor data could not be found. Exiting."))
}#end file check
#Read in tree and root it properly
a.tree = ape::read.tree(astral.tree.name)
a.tree = ape::unroot(a.tree)
if (ape::is.monophyletic(a.tree, outgroups) == T){
spp.tree = ape::root(phy = a.tree, outgroup = outgroups, resolve.root = T)
} else{ spp.tree = ape::root(phy = a.tree, outgroup = outgroups[1], resolve.root = T) }
#Formats the node data
con.data = readConcordance(file.name = cf.file.name)
node.vals = stringr::str_split(pattern = ";", con.data$Label)
node.data = as.data.frame(do.call(rbind, node.vals))
if (ncol(node.data) != 1){
node.data$V1 = gsub("\\[", "", node.data$V1)
colnames(node.data) = c("q1", "q2", "q3", "f1", 'f2', "f3", "pp1", "pp2", "pp3",
"QC", "EN")
#Adds in node number
node.data = cbind(node = con.data$node, node.data)
#Node data
node.data$q1 = round(as.numeric(gsub("q1=", "", node.data$q1)), 3)
node.data$q2 = round(as.numeric(gsub("q2=", "", node.data$q2)), 3)
node.data$q3 = round(as.numeric(gsub("q3=", "", node.data$q3)), 3)
node.data$f1 = round(as.numeric(gsub("f1=", "", node.data$f1)), 3)
node.data$f2 = round(as.numeric(gsub("f2=", "", node.data$f2)), 3)
node.data$f3 = round(as.numeric(gsub("f3=", "", node.data$f3)), 3)
node.data$pp1 = round(as.numeric(gsub("pp1=", "", node.data$pp1)), 3)
node.data$pp2 = round(as.numeric(gsub("pp2=", "", node.data$pp2)), 3)
node.data$pp3 = round(as.numeric(gsub("pp3=", "", node.data$pp3)), 3)
node.data$EN = gsub("].*", "", node.data$EN)
node.data$EN = round(as.numeric(gsub("EN=", "", node.data$EN)), 3)
node.data$QC = round(as.numeric(gsub("QC=", "", node.data$QC)), 3)
} else {
node.data = data.frame(node = con.data$node, label = node.data$V1)
}
spp.tree$edge.length[is.na(spp.tree$edge.length) == T] = tip.length
edge.node = edgeLengthTable(tree = spp.tree, tips = T)
con.data$Dataset = NULL
con.data$Label = NULL
raw.tree = spp.tree
raw.tree$node.label = node.data$node
#Makes new S4 class out of data
astral.object = new("AstralPlane",
fileName = cf.file.name,
samples = raw.tree$tip.label,
phylo = raw.tree,
nodeData = node.data,
edgeData = edge.node,
concordanceFactorData = con.data)
return(astral.object)
}#end function
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.