term-rewriting-0.4.0.2: Term Rewriting Library

Safe HaskellNone
LanguageHaskell98

Data.Rewriting.Problem.Type

Documentation

data Strategy Source #

Constructors

Innermost 
Full 
Outermost 
Instances
Eq Strategy Source # 
Instance details

Defined in Data.Rewriting.Problem.Type

Show Strategy Source # 
Instance details

Defined in Data.Rewriting.Problem.Type

data RulesPair f v Source #

Constructors

RulesPair 

Fields

Instances
(Eq v, Eq f) => Eq (RulesPair f v) Source # 
Instance details

Defined in Data.Rewriting.Problem.Type

Methods

(==) :: RulesPair f v -> RulesPair f v -> Bool #

(/=) :: RulesPair f v -> RulesPair f v -> Bool #

(Show v, Show f) => Show (RulesPair f v) Source # 
Instance details

Defined in Data.Rewriting.Problem.Type

Methods

showsPrec :: Int -> RulesPair f v -> ShowS #

show :: RulesPair f v -> String #

showList :: [RulesPair f v] -> ShowS #

data Problem f v Source #

Constructors

Problem 

Fields

Instances
(Show v, Show f) => Show (Problem f v) Source # 
Instance details

Defined in Data.Rewriting.Problem.Type

Methods

showsPrec :: Int -> Problem f v -> ShowS #

show :: Problem f v -> String #

showList :: [Problem f v] -> ShowS #

(Eq f, Eq v, Pretty f, Pretty v) => Pretty (Problem f v) Source # 
Instance details

Defined in Data.Rewriting.Problem.Pretty

Methods

pretty :: Problem f v -> Doc #

prettyList :: [Problem f v] -> Doc #

data Theory f v Source #

Constructors

SymbolProperty String [f] 
Equations [Rule f v] 
Instances
(Eq f, Eq v) => Eq (Theory f v) Source # 
Instance details

Defined in Data.Rewriting.Problem.Type

Methods

(==) :: Theory f v -> Theory f v -> Bool #

(/=) :: Theory f v -> Theory f v -> Bool #

(Show f, Show v) => Show (Theory f v) Source # 
Instance details

Defined in Data.Rewriting.Problem.Type

Methods

showsPrec :: Int -> Theory f v -> ShowS #

show :: Theory f v -> String #

showList :: [Theory f v] -> ShowS #

allRules :: RulesPair f v -> [Rule f v] Source #

map :: (f -> f') -> (v -> v') -> Problem f v -> Problem f' v' Source #