dg.Test-class {dynamicGraph}R Documentation

Class "dg.Test"

Description

An example class for the test object for the model object of dynamicGraph.

Usage

newDefaultTestObject(name)

Arguments

name Text string with the name of the test object.

Value

An object of class dg.Test.

Objects from the Class

The methods label and width should be implemented by you for your test object returned by the method testEdge of your model object.

Slots

deviance:
Object of class "numeric": The deviance of the test.
df:
Object of class "numeric": The df of the test.
p:
Object of class "numeric": The p-value of the test.

Methods

label
signature(object = "dg.Test"): Return the label of the test.
width
signature(object = "dg.Test"): Return the width of the test.

Author(s)

Jens Henrik Badsberg

See Also

dg.Model-class.

Examples

# Part of the example "defaultObjects" of demo:

setClass("your.Test", 
         representation(deviance = "numeric", df = "numeric", p = "numeric"))

"newYourTestObject" <- function(name) {
    df <- round(runif(1, 1, 25))
    message("Just generating a random test!!!!!")
    deviance <- rchisq(1, df)
    p <- 1 - pchisq(deviance, df)
    result <- new("your.Test", df = df, deviance = deviance, p = p)
    return(result)
  }

if (!isGeneric("label") && !isGeneric("label", where = 2)) {
  if (is.function("label"))
    fun <- label
  else
    fun <- function(object) standardGeneric("label")
  setGeneric("label", fun)
}

setMethod("label", "your.Test",
          function(object) format(object@p, digits = 4))

if (!isGeneric("width") && !isGeneric("width", where = 2)) {
  if (is.function("width"))
    fun <- width
  else
    fun <- function(object) standardGeneric("width")
  setGeneric("width", fun)
}

setMethod("width", "your.Test",
          function(object) round(2 + 5 * (1 - object@p)))

newYourTestObject("TestObject")

[Package dynamicGraph version 0.1.7.0 Index]