term-rewriting-0.2.1.1: Term Rewriting Library

Safe HaskellNone
LanguageHaskell98

Data.Rewriting.Problem.Type

Documentation

data RulesPair f v Source #

Constructors

RulesPair 

Fields

Instances

(Eq f, Eq v) => Eq (RulesPair f v) Source # 

Methods

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

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

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

Methods

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

show :: RulesPair f v -> String #

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

data Problem f v Source #

Constructors

Problem 

Instances

(Show f, Show v) => Show (Problem f v) Source # 

Methods

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

show :: Problem f v -> String #

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

data Theory f v Source #

Constructors

SymbolProperty String [f] 
Equations [Rule f v] 

Instances

(Eq v, Eq f) => Eq (Theory f v) Source # 

Methods

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

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

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

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 #