module GHC.Version where

import Prelude -- See Note [Why do we import Prelude here?]

cProjectGitCommitId   :: String
cProjectGitCommitId :: String
cProjectGitCommitId   = String
"e4b5cdbdee243e50cc417e1da9507a78222bfb19"

cProjectVersion       :: String
cProjectVersion :: String
cProjectVersion       = String
"9.8.0.20230919"

cProjectVersionInt    :: String
cProjectVersionInt :: String
cProjectVersionInt    = String
"908"

cProjectPatchLevel    :: String
cProjectPatchLevel :: String
cProjectPatchLevel    = String
"020230919"

cProjectPatchLevel1   :: String
cProjectPatchLevel1 :: String
cProjectPatchLevel1   = String
"0"

cProjectPatchLevel2   :: String
cProjectPatchLevel2 :: String
cProjectPatchLevel2   = String
"20230919"