-- | Configuration for the code generator.
module Data.GI.CodeGen.Config
    ( Config(..)
    ) where

import Data.Text (Text)
import Data.GI.CodeGen.Overrides (Overrides)

data Config = Config {
      -- | Name of the module being generated.
      Config -> Text
modName        :: Text,
      -- | Whether to print extra info.
      Config -> Bool
verbose        :: Bool,
      -- | List of loaded overrides for the code generator.
      Config -> Overrides
overrides      :: Overrides
    } deriving Int -> Config -> ShowS
[Config] -> ShowS
Config -> String
(Int -> Config -> ShowS)
-> (Config -> String) -> ([Config] -> ShowS) -> Show Config
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Config] -> ShowS
$cshowList :: [Config] -> ShowS
show :: Config -> String
$cshow :: Config -> String
showsPrec :: Int -> Config -> ShowS
$cshowsPrec :: Int -> Config -> ShowS
Show