Skip to content

Commit

Permalink
make R CMD check happy again
Browse files Browse the repository at this point in the history
  • Loading branch information
KlausVigo committed Mar 13, 2019
1 parent 558cab3 commit 71bb195
Show file tree
Hide file tree
Showing 9 changed files with 14 additions and 22 deletions.
1 change: 0 additions & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -73,7 +73,6 @@ export(Children)
export(Descendants)
export(KF.dist)
export(NJ)
export(PNJ)
export(RF.dist)
export(RI)
export(SH.test)
Expand Down
3 changes: 0 additions & 3 deletions R/distTree.R
Original file line number Diff line number Diff line change
Expand Up @@ -131,7 +131,6 @@ upgma_nni <- function(d, method = "average", opt = "min", trace = 0,
#' This function performs the neighbor-joining tree estimation of Saitou and
#' Nei (1987). UNJ is the unweighted version from Gascuel (1997).
#'
#' @aliases PNJ
#'
#' @param x A distance matrix.
#' @return an object of class \code{"phylo"}.
Expand Down Expand Up @@ -215,8 +214,6 @@ UNJ <- function(x){
}


#' @rdname phangorn-internal
#' @export
PNJ <- function(data)
{
q <- l <- r <- length(data)
Expand Down
9 changes: 5 additions & 4 deletions R/phyDat.R
Original file line number Diff line number Diff line change
Expand Up @@ -1114,13 +1114,14 @@ unique.phyDat <- function(x, incomparables=FALSE, identical=TRUE, ...){

#' @rdname phyDat
#' @export
removeUndeterminedSites <- function(x, use.contrast=TRUE,
undetermined=c("?", "n", "-"), ...){
removeUndeterminedSites <- function(x, ...){
# , use.contrast=TRUE, undetermined=c("?", "n", "-")
nc <- attr(x, "nc")
nr <- attr(x, "nr")
contrast <- attr(x, "contrast")
if(use.contrast) ind <- which( (contrast %*% rep(1, nc)) == nc )
else ind <- sort(match(undetermined, attr(x, "allLevels")))
# if(use.contrast)
ind <- which( (contrast %*% rep(1, nc)) == nc )
# else ind <- sort(match(undetermined, attr(x, "allLevels")))
tmp <- x[[1]] %in% ind
for(i in 2:length(x)) tmp <- tmp & (x[[i]] %in% ind)
if(any(tmp)) x <- getRows(x, (1:nr)[!tmp]) #getRows(x, -which(tmp))
Expand Down
2 changes: 1 addition & 1 deletion R/pmlMix.R
Original file line number Diff line number Diff line change
Expand Up @@ -272,7 +272,7 @@ optimMixEdge <- function(object, omega, trace = 1, ...) {
#' only allowed on the left-hand side. The convergence of the algorithm is
#' very slow and is likely that the algorithm can get stuck in local optima.
#'
#' @aliases pmlMix pmlPen
#' @aliases pmlMix
#' @param formula a formula object (see details).
#' @param fit an object of class \code{pml}.
#' @param m number of mixtures.
Expand Down
2 changes: 1 addition & 1 deletion R/pmlPen.R
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
##
## pmlPen penalized ML
##
#' @rdname pmlMix
#' @rdname phangorn-internal
#' @export
pmlPen <- function(object, lambda, ...) {
if (inherits(object, "pmlPart")) return(pmlPartPen(object, lambda, ...))
Expand Down
1 change: 0 additions & 1 deletion man/NJ.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

10 changes: 5 additions & 5 deletions man/phangorn-internal.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 1 addition & 2 deletions man/phyDat.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

5 changes: 1 addition & 4 deletions man/pmlMix.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 71bb195

Please sign in to comment.