{-# LANGUAGE OverloadedStrings #-}
-- | Build time configuration used during code generation.
module GI.Ggit.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
"namespace Ggit"
 , Text
""
 , Text
"ignore ObjectFactory"]