{-# LANGUAGE DeriveAnyClass #-}
module Horizon.Spec.Types.OverlayExportSettings (OverlayExportSettings(MkOverlayExportSettings), packagesDir, overlayFile, overlay) where

import           Data.Kind                      (Type)
import           Dhall                          (FromDhall, Generic, ToDhall)
import           Horizon.Spec.Types.Overlay     (Overlay)
import           Horizon.Spec.Types.OverlayFile (OverlayFile)
import           Horizon.Spec.Types.PackagesDir (PackagesDir)

type OverlayExportSettings :: Type
data OverlayExportSettings where
  MkOverlayExportSettings :: { OverlayExportSettings -> PackagesDir
packagesDir :: PackagesDir
                                , OverlayExportSettings -> OverlayFile
overlayFile :: OverlayFile
                                , OverlayExportSettings -> Overlay
overlay :: Overlay } -> OverlayExportSettings
  deriving stock (Int -> OverlayExportSettings -> ShowS
[OverlayExportSettings] -> ShowS
OverlayExportSettings -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [OverlayExportSettings] -> ShowS
$cshowList :: [OverlayExportSettings] -> ShowS
show :: OverlayExportSettings -> String
$cshow :: OverlayExportSettings -> String
showsPrec :: Int -> OverlayExportSettings -> ShowS
$cshowsPrec :: Int -> OverlayExportSettings -> ShowS
Show, OverlayExportSettings -> OverlayExportSettings -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: OverlayExportSettings -> OverlayExportSettings -> Bool
$c/= :: OverlayExportSettings -> OverlayExportSettings -> Bool
== :: OverlayExportSettings -> OverlayExportSettings -> Bool
$c== :: OverlayExportSettings -> OverlayExportSettings -> Bool
Eq, forall x. Rep OverlayExportSettings x -> OverlayExportSettings
forall x. OverlayExportSettings -> Rep OverlayExportSettings x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep OverlayExportSettings x -> OverlayExportSettings
$cfrom :: forall x. OverlayExportSettings -> Rep OverlayExportSettings x
Generic)
  deriving anyclass (InputNormalizer -> Decoder OverlayExportSettings
forall a. (InputNormalizer -> Decoder a) -> FromDhall a
autoWith :: InputNormalizer -> Decoder OverlayExportSettings
$cautoWith :: InputNormalizer -> Decoder OverlayExportSettings
FromDhall, InputNormalizer -> Encoder OverlayExportSettings
forall a. (InputNormalizer -> Encoder a) -> ToDhall a
injectWith :: InputNormalizer -> Encoder OverlayExportSettings
$cinjectWith :: InputNormalizer -> Encoder OverlayExportSettings
ToDhall)