R/check.preservation.R

Defines functions is_preserved

Documented in is_preserved

#' @title Check preservation
#' @description Checks if a partial ranking is preserved in the ranking induced by `scores`.
#' @param P A partial ranking as matrix object calculated with [neighborhood_inclusion]
#'    or [positional_dominance].
#' @param scores Numeric vector containing the scores of a centrality index.
#' @details In order for a score vector to preserve a partial ranking, the following
#' condition must be fulfilled:
#' \code{P[u,v]==1 & scores[i]<=scores[j]}.
#' @return Logical scaler whether \code{scores} preserves the relations in \code{P}.
#' @author David Schoch
#' @examples
#'
#' library(igraph)
#' # standard measures of centrality preserve the neighborhood inclusion preorder
#' data("dbces11")
#' P <- neighborhood_inclusion(dbces11)
#'
#' is_preserved(P, degree(dbces11))
#' is_preserved(P, betweenness(dbces11))
#' is_preserved(P, closeness(dbces11))
#' @export
is_preserved <- function(P, scores) {
  n <- nrow(P)
  preserved <- preserve(as.matrix(P), scores, n) == 0

  return(preserved)
}

Try the netrankr package in your browser

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

netrankr documentation built on Aug. 20, 2023, 5:06 p.m.