{-# LANGUAGE Safe #-}
{-# LANGUAGE CPP #-}
{-# LANGUAGE QuasiQuotes #-}
{-# LANGUAGE OverloadedStrings #-}
module Cryptol.Prelude
( preludeContents
, floatContents
, arrayContents
, cryptolTcContents
) where
import Data.ByteString(ByteString)
import qualified Data.ByteString.Char8 as B
import Text.Heredoc (there)
preludeContents :: ByteString
preludeContents = B.pack [there|lib/Cryptol.cry|]
floatContents :: ByteString
floatContents = B.pack [there|lib/Float.cry|]
arrayContents :: ByteString
arrayContents = B.pack [there|lib/Array.cry|]
cryptolTcContents :: String
cryptolTcContents = [there|lib/CryptolTC.z3|]