IG {FCBF}R Documentation

Information Gain This functions runs Information Gain for two features, returning the score

Description

Information Gain This functions runs Information Gain for two features, returning the score

Usage

IG(x, y, base = exp(1))

Arguments

x

A vector containing a categorical feature

y

A vector containing other categorical feature

base

The base used for the logaritmic function. The default is exp(1) (~2.718)

Value

A numerical value for the Information Gain score

Examples

  data(scDengue)
  exprs <- SummarizedExperiment::assay(scDengue, 'logcounts')
  discrete_expression <- as.data.frame(discretize_exprs(exprs))
  discrete_expression_gene_1 <- discrete_expression$V1
  discrete_expression_gene_2 <- discrete_expression$V2
  IG(discrete_expression_gene_1,discrete_expression_gene_2)

[Package FCBF version 1.8.0 Index]