{-# LANGUAGE CPP #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}
module Cryptol.Prelude
( preludeContents
, preludeReferenceContents
, floatContents
, arrayContents
, suiteBContents
, primeECContents
, cryptolTcContents
) where
import Data.ByteString (ByteString)
import Data.FileEmbed (embedFileRelative)
import qualified Data.ByteString.Char8 as B
preludeContents :: ByteString
preludeContents :: ByteString
preludeContents = $(embedFileRelative "lib/Cryptol.cry")
preludeReferenceContents :: ByteString
preludeReferenceContents :: ByteString
preludeReferenceContents = $(embedFileRelative "lib/Cryptol/Reference.cry")
floatContents :: ByteString
floatContents :: ByteString
floatContents = $(embedFileRelative "lib/Float.cry")
arrayContents :: ByteString
arrayContents :: ByteString
arrayContents = $(embedFileRelative "lib/Array.cry")
suiteBContents :: ByteString
suiteBContents :: ByteString
suiteBContents = $(embedFileRelative "lib/SuiteB.cry")
primeECContents :: ByteString
primeECContents :: ByteString
primeECContents = $(embedFileRelative "lib/PrimeEC.cry")
cryptolTcContents :: String
cryptolTcContents :: String
cryptolTcContents = ByteString -> String
B.unpack $(embedFileRelative "lib/CryptolTC.z3")