{-# LANGUAGE OverloadedStrings #-}
-- | Build time configuration used during code generation.
module GI.Gdk.Config ( overrides ) where

import qualified Data.Text as T
import Data.Text (Text)

-- | Overrides used when generating these bindings.
overrides :: Text
overrides :: Text
overrides = [Text] -> Text
T.unlines
 [ Text
"# In most APIs these are used as guint, but they are declared as gint."
 , Text
"# See https://github.com/haskell-gi/haskell-gi/issues/58"
 , Text
"set-attr Gdk/~KEY_.*@constant/@type name guint"]