Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data Info = Info {}
- data State = State {}
- data Transition = Transition {}
- type InputMap = Map Tagged Bool
- type Store = Map Tagged Assignment
- data Assignment
- emptyInput :: InputMap
- emptyStore :: Map k a
- store_union :: Store -> Store -> Store
- store_unions :: [Store] -> Store
- make_assignments :: Store -> State -> State
- derive :: Tagged -> State -> State
- derive_all :: [Tagged] -> State -> State
- create :: Tagged -> State -> State
- create_all :: [Tagged] -> State -> State
- terminate :: Tagged -> State -> State
- terminate_all :: [Tagged] -> State -> State
- obfuscate :: Tagged -> State -> State
- obfuscate_all :: [Tagged] -> State -> State
- holds :: Tagged -> State -> Bool
- emptyState :: State
- increment_time :: State -> State
- state_holds :: State -> [Tagged]
- state_input_holds :: State -> InputMap -> [Tagged]
- state_not_holds :: State -> [Tagged]
- input_holds :: InputMap -> [Tagged]
- data Context = Context {
- ctx_spec :: Spec
- ctx_state :: State
- ctx_transitions :: [Transition]
- ctx_duties :: [Tagged]
- emptyContext :: Spec -> Context
- data TransInfo = TransInfo {}
- trans_is_action :: TransInfo -> Bool
- data Violation
- data QueryRes
- data Error
- data RuntimeError
- data InternalError
- print_error :: Error -> String
- print_runtime_error :: RuntimeError -> String
- print_internal_error :: InternalError -> String
Documentation
data Transition Source #
Instances
Eq Transition Source # | |
Defined in Language.EFLINT.State (==) :: Transition -> Transition -> Bool # (/=) :: Transition -> Transition -> Bool # | |
Ord Transition Source # | |
Defined in Language.EFLINT.State compare :: Transition -> Transition -> Ordering # (<) :: Transition -> Transition -> Bool # (<=) :: Transition -> Transition -> Bool # (>) :: Transition -> Transition -> Bool # (>=) :: Transition -> Transition -> Bool # max :: Transition -> Transition -> Transition # min :: Transition -> Transition -> Transition # | |
Read Transition Source # | |
Defined in Language.EFLINT.State readsPrec :: Int -> ReadS Transition # readList :: ReadS [Transition] # readPrec :: ReadPrec Transition # readListPrec :: ReadPrec [Transition] # | |
Show Transition Source # | |
Defined in Language.EFLINT.State showsPrec :: Int -> Transition -> ShowS # show :: Transition -> String # showList :: [Transition] -> ShowS # |
data Assignment Source #
Instances
Eq Assignment Source # | |
Defined in Language.EFLINT.State (==) :: Assignment -> Assignment -> Bool # (/=) :: Assignment -> Assignment -> Bool # | |
Ord Assignment Source # | |
Defined in Language.EFLINT.State compare :: Assignment -> Assignment -> Ordering # (<) :: Assignment -> Assignment -> Bool # (<=) :: Assignment -> Assignment -> Bool # (>) :: Assignment -> Assignment -> Bool # (>=) :: Assignment -> Assignment -> Bool # max :: Assignment -> Assignment -> Assignment # min :: Assignment -> Assignment -> Assignment # | |
Read Assignment Source # | |
Defined in Language.EFLINT.State readsPrec :: Int -> ReadS Assignment # readList :: ReadS [Assignment] # readPrec :: ReadPrec Assignment # readListPrec :: ReadPrec [Assignment] # | |
Show Assignment Source # | |
Defined in Language.EFLINT.State showsPrec :: Int -> Assignment -> ShowS # show :: Assignment -> String # showList :: [Assignment] -> ShowS # |
emptyStore :: Map k a Source #
store_union :: Store -> Store -> Store Source #
based union over stores, precedence HoldsTrue > HoldsFalse > Unknown
store_unions :: [Store] -> Store Source #
emptyState :: State Source #
increment_time :: State -> State Source #
state_holds :: State -> [Tagged] Source #
state_not_holds :: State -> [Tagged] Source #
input_holds :: InputMap -> [Tagged] Source #
Context | |
|
emptyContext :: Spec -> Context Source #
TransInfo | |
|
trans_is_action :: TransInfo -> Bool Source #
data RuntimeError Source #
Instances
Eq RuntimeError Source # | |
Defined in Language.EFLINT.State (==) :: RuntimeError -> RuntimeError -> Bool # (/=) :: RuntimeError -> RuntimeError -> Bool # | |
Ord RuntimeError Source # | |
Defined in Language.EFLINT.State compare :: RuntimeError -> RuntimeError -> Ordering # (<) :: RuntimeError -> RuntimeError -> Bool # (<=) :: RuntimeError -> RuntimeError -> Bool # (>) :: RuntimeError -> RuntimeError -> Bool # (>=) :: RuntimeError -> RuntimeError -> Bool # max :: RuntimeError -> RuntimeError -> RuntimeError # min :: RuntimeError -> RuntimeError -> RuntimeError # | |
Read RuntimeError Source # | |
Defined in Language.EFLINT.State readsPrec :: Int -> ReadS RuntimeError # readList :: ReadS [RuntimeError] # | |
Show RuntimeError Source # | |
Defined in Language.EFLINT.State showsPrec :: Int -> RuntimeError -> ShowS # show :: RuntimeError -> String # showList :: [RuntimeError] -> ShowS # |
data InternalError Source #
EnumerateInfiniteDomain DomId Domain | |
MissingSubstitution Var | |
PrimitiveApplication DomId | |
UndeclaredType DomId |
Instances
Eq InternalError Source # | |
Defined in Language.EFLINT.State (==) :: InternalError -> InternalError -> Bool # (/=) :: InternalError -> InternalError -> Bool # | |
Ord InternalError Source # | |
Defined in Language.EFLINT.State compare :: InternalError -> InternalError -> Ordering # (<) :: InternalError -> InternalError -> Bool # (<=) :: InternalError -> InternalError -> Bool # (>) :: InternalError -> InternalError -> Bool # (>=) :: InternalError -> InternalError -> Bool # max :: InternalError -> InternalError -> InternalError # min :: InternalError -> InternalError -> InternalError # | |
Read InternalError Source # | |
Defined in Language.EFLINT.State readsPrec :: Int -> ReadS InternalError # readList :: ReadS [InternalError] # | |
Show InternalError Source # | |
Defined in Language.EFLINT.State showsPrec :: Int -> InternalError -> ShowS # show :: InternalError -> String # showList :: [InternalError] -> ShowS # |
print_error :: Error -> String Source #