{-# LANGUAGE CPP #-}
module Config where

import GhcPrelude

#include "ghc_boot_platform.h"

cBuildPlatformString :: String
cBuildPlatformString = BuildPlatform_NAME
cHostPlatformString :: String
cHostPlatformString = HostPlatform_NAME

cProjectName          :: String
cProjectName          = "The Glorious Glasgow Haskell Compilation System"
cProjectGitCommitId   :: String
cProjectGitCommitId   = "a25f6f55eaca0d3ec36afb574d5fa9326ea09d55"
cProjectVersion       :: String
cProjectVersion       = "8.9.0.20190703"
cProjectVersionInt    :: String
cProjectVersionInt    = "809"
cProjectPatchLevel    :: String
cProjectPatchLevel    = "020190703"
cProjectPatchLevel1   :: String
cProjectPatchLevel1   = "0"
cProjectPatchLevel2   :: String
cProjectPatchLevel2   = "20190703"
cBooterVersion        :: String
cBooterVersion        = "8.6.5"
cStage                :: String
cStage                = show (STAGE :: Int)