{-# LANGUAGE CPP #-}
module GHC.Settings.Config
  ( module GHC.Version
  , cBuildPlatformString
  , cHostPlatformString
  , cProjectName
  , cBooterVersion
  , cStage
  ) where

import GHC.Prelude

import GHC.Version

cBuildPlatformString :: String
cBuildPlatformString :: String
cBuildPlatformString = String
"x86_64-unknown-linux"

cHostPlatformString :: String
cHostPlatformString :: String
cHostPlatformString = String
"x86_64-unknown-linux"

cProjectName          :: String
cProjectName :: String
cProjectName          = String
"The Glorious Glasgow Haskell Compilation System"

cBooterVersion        :: String
cBooterVersion :: String
cBooterVersion        = String
"8.10.7"

cStage                :: String
cStage :: String
cStage                = forall a. Show a => a -> String
show (Int
2 :: Int)