R/range.R

Defines functions range.dca.cph range.dca.lrm

Documented in range.dca.cph range.dca.lrm

#' Ranges for net benefit
#'
#' @param ... results of dca() function
#' @name range
#' @method range dca.lrm
#' @return a dataframe contains the minium and maximum of net benefit for each model
#' @export
#'
range.dca.lrm <- function(...){
    d=list(...)[[1]]
    d=d[d$thresholds!=0,]
    model=levels(d$model)
    min=sapply(model, function(i) min((d$NB)[d$model==i]))
    max=sapply(model, function(i) max((d$NB)[d$model==i]))
    res=list(NB=data.frame(min,max))
    min=sapply(model, function(i) min((d$thresholds)[d$model==i]))
    max=sapply(model, function(i) max((d$thresholds)[d$model==i]))
    res$thresholds=data.frame(min,max)
    res
}
#' @rdname range
#' @export
range.dca.cph <- function(...){
    d=list(...)[[1]]
    d=d[d$thresholds!=0,]
    model=levels(d$model)
    min=sapply(model, function(i) min((d$NB)[d$model==i]))
    max=sapply(model, function(i) max((d$NB)[d$model==i]))
    res=list(NB=data.frame(min,max))
    min=sapply(model, function(i) min((d$thresholds)[d$model==i]))
    max=sapply(model, function(i) max((d$thresholds)[d$model==i]))
    res$thresholds=data.frame(min,max)
    res
}

Try the ggDCA package in your browser

Any scripts or data that you put into this service are public.

ggDCA documentation built on Sept. 6, 2020, 5:06 p.m.