Safe Haskell | Safe-Inferred |
---|---|
Language | GHC2021 |
Documentation
parseExpr' :: forall prxy t. KnownSMTSort t => prxy t -> Parser (Expr t) Source #
constant :: forall t. KnownSMTSort t => Parser (HaskellType t) Source #
constantExpr :: forall t. KnownSMTSort t => Parser (Expr t) Source #
anyBitvector :: (KnownBvEnc enc, KnownNat n) => Proxy n -> Parser (Bitvec enc n) Source #
hexBitvector :: (KnownBvEnc enc, KnownNat n) => Proxy n -> Parser (Bitvec enc n) Source #
literalBitvector :: (KnownBvEnc enc, KnownNat n) => Proxy n -> Parser (Bitvec enc n) Source #
constArray :: forall k v. (KnownSMTSort v, Ord (HaskellType k)) => Proxy k -> Proxy v -> Parser (ConstArray (HaskellType k) (HaskellType v)) Source #
unary :: forall t r. KnownSMTSort t => ByteString -> (Expr t -> Expr r) -> Parser (Expr r) Source #
binary :: forall t u r. (KnownSMTSort t, KnownSMTSort u) => ByteString -> (Expr t -> Expr u -> Expr r) -> Parser (Expr r) Source #
ternary :: forall t u v r. (KnownSMTSort t, KnownSMTSort u, KnownSMTSort v) => ByteString -> (Expr t -> Expr u -> Expr v -> Expr r) -> Parser (Expr r) Source #
nary :: forall t r. KnownSMTSort t => ByteString -> ([Expr t] -> Expr r) -> Parser (Expr r) Source #
getValueParser :: KnownSMTSort t => SMTVar t -> Parser (SMTVarSol t) Source #