Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Documentation
type ProcessResult = Either ErrorMessage Value Source #
class ExplorerPostValue p c o where Source #
Nothing
data RequestMessage Source #
Instances
data ResponseMessage Source #
Instances
ToJSON ResponseMessage Source # | |
Defined in Language.Explorer.Tools.Protocol toJSON :: ResponseMessage -> Value # toEncoding :: ResponseMessage -> Encoding # toJSONList :: [ResponseMessage] -> Value # toEncodingList :: [ResponseMessage] -> Encoding # | |
Show ResponseMessage Source # | |
Defined in Language.Explorer.Tools.Protocol showsPrec :: Int -> ResponseMessage -> ShowS # show :: ResponseMessage -> String # showList :: [ResponseMessage] -> ShowS # |
data ErrorMessage Source #
Instances
data JumpParams Source #
Instances
FromJSON JumpParams Source # | |
Defined in Language.Explorer.Tools.Protocol parseJSON :: Value -> Parser JumpParams # parseJSONList :: Value -> Parser [JumpParams] # |
data JumpResult Source #
Instances
ToJSON JumpResult Source # | |
Defined in Language.Explorer.Tools.Protocol toJSON :: JumpResult -> Value # toEncoding :: JumpResult -> Encoding # toJSONList :: [JumpResult] -> Value # toEncodingList :: [JumpResult] -> Encoding # |
data ExecuteParams Source #
Instances
FromJSON ExecuteParams Source # | |
Defined in Language.Explorer.Tools.Protocol parseJSON :: Value -> Parser ExecuteParams # parseJSONList :: Value -> Parser [ExecuteParams] # | |
Generic ExecuteParams Source # | |
Defined in Language.Explorer.Tools.Protocol type Rep ExecuteParams :: Type -> Type # from :: ExecuteParams -> Rep ExecuteParams x # to :: Rep ExecuteParams x -> ExecuteParams # | |
Show ExecuteParams Source # | |
Defined in Language.Explorer.Tools.Protocol showsPrec :: Int -> ExecuteParams -> ShowS # show :: ExecuteParams -> String # showList :: [ExecuteParams] -> ShowS # | |
type Rep ExecuteParams Source # | |
Defined in Language.Explorer.Tools.Protocol type Rep ExecuteParams = D1 ('MetaData "ExecuteParams" "Language.Explorer.Tools.Protocol" "exploring-interpreters-1.4.0.0-EP4IQ6ofril6gCKSnbbHJe" 'False) (C1 ('MetaCons "ExecuteParams" 'PrefixI 'True) (S1 ('MetaSel ('Just "program") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) |
data ExecuteResult Source #
Instances
ToJSON ExecuteResult Source # | |
Defined in Language.Explorer.Tools.Protocol toJSON :: ExecuteResult -> Value # toEncoding :: ExecuteResult -> Encoding # toJSONList :: [ExecuteResult] -> Value # toEncodingList :: [ExecuteResult] -> Encoding # |
data RevertParams Source #
Instances
FromJSON RevertParams Source # | |
Defined in Language.Explorer.Tools.Protocol parseJSON :: Value -> Parser RevertParams # parseJSONList :: Value -> Parser [RevertParams] # |
data RevertResult Source #
RevertResult | |
|
Instances
ToJSON RevertResult Source # | |
Defined in Language.Explorer.Tools.Protocol toJSON :: RevertResult -> Value # toEncoding :: RevertResult -> Encoding # toJSONList :: [RevertResult] -> Value # toEncodingList :: [RevertResult] -> Encoding # |
data DerefParams Source #
Instances
FromJSON DerefParams Source # | |
Defined in Language.Explorer.Tools.Protocol parseJSON :: Value -> Parser DerefParams # parseJSONList :: Value -> Parser [DerefParams] # |
data TraceParams Source #
Instances
FromJSON TraceParams Source # | |
Defined in Language.Explorer.Tools.Protocol parseJSON :: Value -> Parser TraceParams # parseJSONList :: Value -> Parser [TraceParams] # | |
Generic TraceParams Source # | |
Defined in Language.Explorer.Tools.Protocol type Rep TraceParams :: Type -> Type # from :: TraceParams -> Rep TraceParams x # to :: Rep TraceParams x -> TraceParams # | |
type Rep TraceParams Source # | |
Defined in Language.Explorer.Tools.Protocol type Rep TraceParams = D1 ('MetaData "TraceParams" "Language.Explorer.Tools.Protocol" "exploring-interpreters-1.4.0.0-EP4IQ6ofril6gCKSnbbHJe" 'False) (C1 ('MetaCons "TraceParams" 'PrefixI 'True) (S1 ('MetaSel ('Just "reference") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) |
Instances
ToJSON Edge Source # | |
Defined in Language.Explorer.Tools.Protocol | |
Generic Edge Source # | |
type Rep Edge Source # | |
Defined in Language.Explorer.Tools.Protocol type Rep Edge = D1 ('MetaData "Edge" "Language.Explorer.Tools.Protocol" "exploring-interpreters-1.4.0.0-EP4IQ6ofril6gCKSnbbHJe" 'False) (C1 ('MetaCons "Edge" 'PrefixI 'True) (S1 ('MetaSel ('Just "source") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: (S1 ('MetaSel ('Just "target") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 EdgeLabel)))) |
Instances
ToJSON EdgeLabel Source # | |
Defined in Language.Explorer.Tools.Protocol | |
Generic EdgeLabel Source # | |
type Rep EdgeLabel Source # | |
Defined in Language.Explorer.Tools.Protocol type Rep EdgeLabel = D1 ('MetaData "EdgeLabel" "Language.Explorer.Tools.Protocol" "exploring-interpreters-1.4.0.0-EP4IQ6ofril6gCKSnbbHJe" 'False) (C1 ('MetaCons "EdgeLabel" 'PrefixI 'True) (S1 ('MetaSel ('Just "program") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value) :*: S1 ('MetaSel ('Just "mval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value))) |
data ExecutionTree Source #
Instances
data PathParams Source #
Instances
FromJSON PathParams Source # | |
Defined in Language.Explorer.Tools.Protocol parseJSON :: Value -> Parser PathParams # parseJSONList :: Value -> Parser [PathParams] # | |
Generic PathParams Source # | |
Defined in Language.Explorer.Tools.Protocol type Rep PathParams :: Type -> Type # from :: PathParams -> Rep PathParams x # to :: Rep PathParams x -> PathParams # | |
type Rep PathParams Source # | |
Defined in Language.Explorer.Tools.Protocol type Rep PathParams = D1 ('MetaData "PathParams" "Language.Explorer.Tools.Protocol" "exploring-interpreters-1.4.0.0-EP4IQ6ofril6gCKSnbbHJe" 'False) (C1 ('MetaCons "PathParams" 'PrefixI 'True) (S1 ('MetaSel ('Just "source") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "target") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) |
parseErrorCode :: Int Source #
ensureParameter :: Monad m => Maybe Value -> ExceptT ErrorMessage (EIP p m c o) Value Source #
fromResult :: Monad m => Result a -> Value -> ExceptT ErrorMessage (EIP p m c o) Value Source #
jump :: (Monad m, ExplorerPostValue p c o) => Value -> ExceptT ErrorMessage (EIP p m c o) Value Source #
execute :: (Eq o, Monoid o, ToJSON o, Eq p, ExplorerPostValue p c o) => Value -> ExceptT ErrorMessage (EIP p IO c o) Value Source #
revert :: (Eq o, Monoid o, Eq p, ExplorerPostValue p c o) => Value -> ExceptT ErrorMessage (EIP p IO c o) Value Source #
deref :: (Eq o, Monoid o, Eq p, ToJSON c) => Value -> ExceptT ErrorMessage (EIP p IO c o) Value Source #
executionTree :: (ToJSON o, ToJSON p) => ExceptT ErrorMessage (EIP p IO c o) Value Source #
getCurrentReference :: ExceptT ErrorMessage (EIP p IO c o) Value Source #
getAllReferences :: ExceptT ErrorMessage (EIP p IO c o) Value Source #
getTrace :: (ToJSON p, ToJSON o) => Maybe Value -> ExceptT ErrorMessage (EIP p IO c o) Value Source #
methodDispatch :: (Eq o, Monoid o, ToJSON o, ToJSON p, Eq p, ToJSON c, ExplorerPostValue p c o) => String -> Maybe Value -> ExceptT ErrorMessage (EIP p IO c o) Value Source #
handleRequest :: (Eq o, Monoid o, ToJSON o, ToJSON o, ToJSON p, Eq p, ToJSON c, ExplorerPostValue p c o) => Maybe RequestMessage -> EIP p IO c o ResponseMessage Source #
handleRequest' :: (Eq o, Monoid o, ToJSON o, Eq p, ToJSON p, ToJSON c, ExplorerPostValue p c o) => ByteString -> EIP p IO c o ResponseMessage Source #