module Hix.Data.PreprocConfig where

import Data.Aeson (FromJSON)

import Hix.Data.ComponentConfig (PackagesConfig)

data PreprocConfig =
  PreprocConfig {
    PreprocConfig -> PackagesConfig
packages :: PackagesConfig
  }
  deriving stock (PreprocConfig -> PreprocConfig -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PreprocConfig -> PreprocConfig -> Bool
$c/= :: PreprocConfig -> PreprocConfig -> Bool
== :: PreprocConfig -> PreprocConfig -> Bool
$c== :: PreprocConfig -> PreprocConfig -> Bool
Eq, Int -> PreprocConfig -> ShowS
[PreprocConfig] -> ShowS
PreprocConfig -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PreprocConfig] -> ShowS
$cshowList :: [PreprocConfig] -> ShowS
show :: PreprocConfig -> String
$cshow :: PreprocConfig -> String
showsPrec :: Int -> PreprocConfig -> ShowS
$cshowsPrec :: Int -> PreprocConfig -> ShowS
Show, forall x. Rep PreprocConfig x -> PreprocConfig
forall x. PreprocConfig -> Rep PreprocConfig x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep PreprocConfig x -> PreprocConfig
$cfrom :: forall x. PreprocConfig -> Rep PreprocConfig x
Generic)
  deriving anyclass (Value -> Parser [PreprocConfig]
Value -> Parser PreprocConfig
forall a.
(Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a
parseJSONList :: Value -> Parser [PreprocConfig]
$cparseJSONList :: Value -> Parser [PreprocConfig]
parseJSON :: Value -> Parser PreprocConfig
$cparseJSON :: Value -> Parser PreprocConfig
FromJSON)