R/egalitarian.R

Defines functions egalitarian

Documented in egalitarian

#' @title Egalitarian value
#'
#' @description
#' Calculate the egalitarian value
#'
#' @param characteristic_func The valued function defined on the subsets of the number
#' of players
#' @param n_players Only used if \code{characteristic_func} is a \code{function}.
#' The number of players in the game.
#'
#' @return The egalitarian value for each player
#'
#' @examples
#' n <- 10
#' v <- function(coalition) {
#'   if (length(coalition) > n/2) {
#'     return(1)
#'   } else {
#'     return(0)
#'   }
#' }
#' egalitarian(v,n)
#'
#' @export

egalitarian <- function(characteristic_func, n_players = 0) {

  if (is.vector(characteristic_func)) {

    # get number of players
    n_players<-log(length(characteristic_func),2)
    if (n_players!=round(n_players)) {
      characteristic_func <- c(0, characteristic_func)
      n_players<-log(length(characteristic_func+1),2)
    }

    egalitarian_value <- characteristic_func[n_players]/n_players

  } else if (is.function(characteristic_func)) {

    if (n_players < 2) {
      stop("Invalid numer of player specified. n_players must be greater
             than 1.")
    }

    egalitarian_value <- characteristic_func(1:n_players)/n_players

  } else {
    stop("Invalid characteristic_func provided.")
  }

  egalitarian_value <- rep(egalitarian_value, n_players)
  names(egalitarian_value) <- 1:n_players
  return(egalitarian_value)

}

Try the TUvalues package in your browser

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

TUvalues documentation built on June 8, 2025, 10:50 a.m.