{-# LANGUAGE CPP #-}

-- | This module contains flags which control compilation.
module Util.CompileFlags where

isDebug :: Bool
#ifdef DEBUG
isDebug = True
#else
isDebug :: Bool
isDebug = Bool
False
#endif

uniVersion :: String
uniVersion :: String
uniVersion = String
"2.2"