module Language.Fixpoint.Conditional.Z3 where

makeZ3 :: IO a
makeZ3 :: forall a. IO a
makeZ3 = [Char] -> IO a
forall a. HasCallStack => [Char] -> a
error [Char]
"liquid-fixpoint: Not built with the Z3 backend. Please, enable the cabal flag link-z3-as-a-library."

builtWithZ3AsALibrary :: Bool
builtWithZ3AsALibrary :: Bool
builtWithZ3AsALibrary = Bool
False