{-# LANGUAGE CPP #-}
module Config where

#include "ghc_boot_platform.h"

data IntegerLibrary = IntegerGMP | IntegerSimple
    deriving Eq

cBuildPlatformString :: String
cBuildPlatformString = BuildPlatform_NAME
cHostPlatformString :: String
cHostPlatformString = HostPlatform_NAME
cTargetPlatformString :: String
cTargetPlatformString = TargetPlatform_NAME

cProjectName          :: String
cProjectName          = "The Glorious Glasgow Haskell Compilation System"
cProjectVersion       :: String
cProjectVersion       = "7.6.3"
cProjectVersionInt    :: String
cProjectVersionInt    = "706"
cProjectPatchLevel    :: String
cProjectPatchLevel    = "3"
cBooterVersion        :: String
cBooterVersion        = "7.4.1"
cStage                :: String
cStage                = show (STAGE :: Int)
cGccLinkerOpts        :: [String]
cGccLinkerOpts        = words "-Wl,--hash-size=31 -Wl,--reduce-memory-overheads"
cLdLinkerOpts         :: [String]
cLdLinkerOpts         = words "--hash-size=31     --reduce-memory-overheads"
cIntegerLibrary       :: String
cIntegerLibrary       = "integer-gmp"
cIntegerLibraryType   :: IntegerLibrary
cIntegerLibraryType   = IntegerGMP
cSupportsSplitObjs    :: String
cSupportsSplitObjs    = "YES"
cGhcWithInterpreter   :: String
cGhcWithInterpreter   = "YES"
cGhcWithNativeCodeGen :: String
cGhcWithNativeCodeGen = "YES"
cGhcWithSMP           :: String
cGhcWithSMP           = "YES"
cGhcRTSWays           :: String
cGhcRTSWays           = "l debug  thr thr_debug thr_l thr_p dyn debug_dyn thr_dyn thr_debug_dyn"
cGhcUnregisterised    :: String
cGhcUnregisterised    = "NO"
cGhcEnableTablesNextToCode :: String
cGhcEnableTablesNextToCode = "YES"
cLeadingUnderscore    :: String
cLeadingUnderscore    = "NO"
cRAWCPP_FLAGS         :: String
cRAWCPP_FLAGS         = "-undef -traditional"
cLdHasNoCompactUnwind :: String
cLdHasNoCompactUnwind = "YES"
cLdIsGNULd            :: String
cLdIsGNULd            = "YES"
cLdHasBuildId         :: String
cLdHasBuildId         = "YES"
cLD_X                 :: String
cLD_X                 = "-x"
cGHC_DRIVER_DIR       :: String
cGHC_DRIVER_DIR       = "driver"
cGHC_UNLIT_PGM        :: String
cGHC_UNLIT_PGM        = "unlit"
cGHC_UNLIT_DIR        :: String
cGHC_UNLIT_DIR        = "utils/unlit"
cGHC_SPLIT_PGM        :: String
cGHC_SPLIT_PGM        = "ghc-split"
cGHC_SPLIT_DIR        :: String
cGHC_SPLIT_DIR        = "driver/split"
cGHC_SYSMAN_PGM       :: String
cGHC_SYSMAN_PGM       = ""
cGHC_SYSMAN_DIR       :: String
cGHC_SYSMAN_DIR       = "rts/parallel"
cDEFAULT_TMPDIR       :: String
cDEFAULT_TMPDIR       = "/tmp"
cLibFFI               :: Bool
cLibFFI               = False