{-# 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   = "4ba73e00c4887b58d85131601a15d00608acaa60"
cProjectVersion       :: String
cProjectVersion       = "8.9.0.20190522"
cProjectVersionInt    :: String
cProjectVersionInt    = "809"
cProjectPatchLevel    :: String
cProjectPatchLevel    = "020190522"
cProjectPatchLevel1   :: String
cProjectPatchLevel1   = "0"
cProjectPatchLevel2   :: String
cProjectPatchLevel2   = "20190522"
cBooterVersion        :: String
cBooterVersion        = "8.6.5"
cStage                :: String
cStage                = show (STAGE :: Int)