{-# LANGUAGE OverloadedStrings #-}
-- | Build time configuration used during code generation.
module GI.Gtk.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
"C-docs-url Gtk https://docs.gtk.org/gtk4"
 , Text
""
 , Text
"# The introspection annotation marks the parameters as"
 , Text
"# (out caller-allocates), but it is just a pointer to a GValue."
 , Text
"set-attr Gtk/TreeModelFilterModifyFunc/@parameters/value direction in"
 , Text
"set-attr Gtk/TreeModelFilterModifyFunc/@parameters/value caller-allocates 0"
 , Text
""
 , Text
"# The introspection annotation marks the parameters as"
 , Text
"# (inout transfer=full), but it is just a pointer to a GtkTreeIter."
 , Text
"set-attr Gtk/TreeStore/remove/@parameters/iter direction in"
 , Text
"set-attr Gtk/TreeStore/remove/@parameters/iter transfer-ownership none"
 , Text
""
 , Text
"# The introspection annotation marks the parameters as"
 , Text
"# (inout transfer=full), but it is just a pointer to a GtkTreeIter."
 , Text
"set-attr Gtk/TreeModel/iter_next/@parameters/iter direction in"
 , Text
"set-attr Gtk/TreeModel/iter_next/@parameters/iter transfer-ownership none"
 , Text
""
 , Text
"# The introspection annotation marks the parameters as"
 , Text
"# (inout transfer=full), but it is just a pointer to a GtkTreeIter."
 , Text
"set-attr Gtk/TreeModel/iter_previous/@parameters/iter direction in"
 , Text
"set-attr Gtk/TreeModel/iter_previous/@parameters/iter transfer-ownership none"
 , Text
""
 , Text
"# The introspection annotation marks the parameters as"
 , Text
"# (out caller-allocates), but it is just a pointer to a GtkTreeIter."
 , Text
"set-attr Gtk/TreeModel/iter_nth_child/@parameters/iter direction in"
 , Text
"set-attr Gtk/TreeModel/iter_nth_child/@parameters/iter caller-allocates 0"
 , Text
""
 , Text
"# It is useful to expose these class structs when deriving new types"
 , Text
"set-attr Gtk/WidgetClass haskell-gi-force-visible 1"
 , Text
"set-attr Gtk/ContainerClass haskell-gi-force-visible 1"]