Hoed-0.4.1: Lightweight algorithmic debugging.

Safe HaskellNone
LanguageHaskell2010

Debug.Hoed.CompTree

Synopsis

Documentation

type CompTree = Graph Vertex () Source #

The forest of computation trees. Also see the Libgraph library.

data Vertex Source #

Instances

Eq Vertex Source # 

Methods

(==) :: Vertex -> Vertex -> Bool #

(/=) :: Vertex -> Vertex -> Bool #

Ord Vertex Source # 
Show Vertex Source # 
Generic Vertex Source # 

Associated Types

type Rep Vertex :: * -> * #

Methods

from :: Vertex -> Rep Vertex x #

to :: Rep Vertex x -> Vertex #

type Rep Vertex Source # 
type Rep Vertex = D1 * (MetaData "Vertex" "Debug.Hoed.CompTree" "Hoed-0.4.1-Fh2KHxaUpgT9nkXsBQ3eq3" False) ((:+:) * (C1 * (MetaCons "RootVertex" PrefixI False) (U1 *)) (C1 * (MetaCons "Vertex" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "vertexStmt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * CompStmt)) (S1 * (MetaSel (Just Symbol "vertexJmt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Judgement)))))

mkCompTree :: [CompStmt] -> Dependencies -> CompTree Source #

unjudgedCharacterCount :: CompTree -> Int Source #

Approximates the complexity of a computation tree by summing the length of the unjudged computation statements (i.e not Right or Wrong) in the tree.

data TraceInfo Source #

Constructors

TraceInfo 

Fields

data Graph vertex arc :: * -> * -> * #

Constructors

Graph 

Fields

Instances

Generic (Graph vertex arc) 

Associated Types

type Rep (Graph vertex arc) :: * -> * #

Methods

from :: Graph vertex arc -> Rep (Graph vertex arc) x #

to :: Rep (Graph vertex arc) x -> Graph vertex arc #

type Rep (Graph vertex arc) 
type Rep (Graph vertex arc) = D1 * (MetaData "Graph" "Data.Graph.Libgraph.Core" "libgraph-1.14-AJy13LrUf4nKnHh8DlJeOm" False) (C1 * (MetaCons "Graph" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "root") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * vertex)) ((:*:) * (S1 * (MetaSel (Just Symbol "vertices") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * [vertex])) (S1 * (MetaSel (Just Symbol "arcs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * [Arc vertex arc])))))