hylolib-1.5.1: Tools for hybrid logics related programs

Safe HaskellNone
LanguageHaskell2010

HyLo.Model.Herbrand

Documentation

data HerbrandModel n p r Source #

Instances

(Ord r, Ord n, Ord p, ModelsRel (Model n n p r, n) f n p r) => ModelsRel (HerbrandModel n p r, n) f n p r Source # 

Methods

(|=) :: (HerbrandModel n p r, n) -> f -> Bool Source #

(Ord r, Ord n, Ord p) => HasSignature (HerbrandModel n p r) Source # 

Associated Types

type NomsOf (HerbrandModel n p r) :: * Source #

type PropsOf (HerbrandModel n p r) :: * Source #

type RelsOf (HerbrandModel n p r) :: * Source #

(Ord r, Ord n, Ord p, ModelsRel (Model n n p r) f n p r) => ModelsRel (HerbrandModel n p r) f n p r Source # 

Methods

(|=) :: HerbrandModel n p r -> f -> Bool Source #

type NomsOf (HerbrandModel n p r) Source # 
type NomsOf (HerbrandModel n p r) = n
type PropsOf (HerbrandModel n p r) Source # 
type PropsOf (HerbrandModel n p r) = p
type RelsOf (HerbrandModel n p r) Source # 
type RelsOf (HerbrandModel n p r) = r

herbrand :: (Ord n, Ord p, Ord r) => Set (n, n) -> Set (n, p) -> Set (n, r, n) -> HerbrandModel n p r Source #

inducedModel :: (Ord r, Ord n, Ord p) => HerbrandModel n p r -> Model n n p r Source #

expand :: (Ord n, Ord p, Ord r) => Signature n p r -> HerbrandModel n p r -> HerbrandModel n p r Source #

removeWorld :: (Ord n, Ord p, Ord r) => n -> HerbrandModel n p r -> HerbrandModel n p r Source #