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

import GhcPrelude

import GHC.Version

#include "ghc_boot_platform.h"

cBuildPlatformString :: String
cBuildPlatformString = BuildPlatform_NAME

cHostPlatformString :: String
cHostPlatformString = HostPlatform_NAME

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

cBooterVersion        :: String
cBooterVersion        = "8.6.5"

cStage                :: String
cStage                = show (STAGE :: Int)