{-# LANGUAGE OverloadedStrings #-}
-- | Build time configuration used during code generation.
module GI.Vte.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
 [ "namespace Vte"
 , ""
 , "# This function is deprecated, does nothing, and the introspection"
 , "# data is wrong."
 , "ignore Terminal.event_check_gregex_simple"
 , ""
 , "# Wrong introspection data."
 , "ignore Terminal.event_check_regex_simple"
 , ""
 , "# The return value is nullable, but it is not properly annotated as such"
 , "# https://github.com/haskell-gi/haskell-gi/issues/179"
 , "set-attr Vte/Terminal/get_current_directory_uri/@return-value nullable 1"
 , ""
 , "# The return value is nullable, but it is not properly annotated as such"
 , "# https://github.com/haskell-gi/haskell-gi/issues/185"
 , "set-attr Vte/Terminal/get_window_title/@return-value nullable 1"]