crucible-llvm-0.6: Support for translating and executing LLVM code in Crucible
Copyright(c) Galois Inc 2018
LicenseBSD3
MaintainerLangston Barrett <lbarrett@galois.com>
Stabilityprovisional
Safe HaskellSafe-Inferred
LanguageHaskell2010

Lang.Crucible.LLVM.Errors

Contents

Description

 
Synopsis

Documentation

data LLVMSafetyAssertion sym Source #

Instances

Instances details
Generic (LLVMSafetyAssertion sym) Source # 
Instance details

Defined in Lang.Crucible.LLVM.Errors

Associated Types

type Rep (LLVMSafetyAssertion sym) :: Type -> Type #

type Rep (LLVMSafetyAssertion sym) Source # 
Instance details

Defined in Lang.Crucible.LLVM.Errors

type Rep (LLVMSafetyAssertion sym) = D1 ('MetaData "LLVMSafetyAssertion" "Lang.Crucible.LLVM.Errors" "crucible-llvm-0.6-JJ7tfvbGrbFFTkl5eJBN3H" 'False) (C1 ('MetaCons "LLVMSafetyAssertion" 'PrefixI 'True) (S1 ('MetaSel ('Just "_classifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BadBehavior sym)) :*: (S1 ('MetaSel ('Just "_predicate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Pred sym)) :*: S1 ('MetaSel ('Just "_extra") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))

data BadBehavior sym where Source #

Combine the three types of bad behaviors

detailBB :: IsExpr (SymExpr sym) => BadBehavior sym -> Doc ann Source #

explainBB :: IsExpr (SymExpr sym) => BadBehavior sym -> Doc ann Source #

ppBB :: IsExpr (SymExpr sym) => BadBehavior sym -> Doc ann Source #

concBadBehavior :: IsExprBuilder sym => sym -> (forall tp. SymExpr sym tp -> IO (GroundValue tp)) -> BadBehavior sym -> IO (BadBehavior sym) Source #

Lenses