module Horizon.Spec.Types.Overlay (Overlay(MkOverlay), fromOverlay) where

import           Data.Kind                     (Type)
import           Dhall                         (FromDhall, Generic, ToDhall)
import           Horizon.Spec.Types.PackageSet (PackageSet)

type Overlay :: Type
newtype Overlay where
  MkOverlay :: { Overlay -> PackageSet
fromOverlay :: PackageSet } -> Overlay
  deriving stock (Int -> Overlay -> ShowS
[Overlay] -> ShowS
Overlay -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Overlay] -> ShowS
$cshowList :: [Overlay] -> ShowS
show :: Overlay -> String
$cshow :: Overlay -> String
showsPrec :: Int -> Overlay -> ShowS
$cshowsPrec :: Int -> Overlay -> ShowS
Show, Overlay -> Overlay -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Overlay -> Overlay -> Bool
$c/= :: Overlay -> Overlay -> Bool
== :: Overlay -> Overlay -> Bool
$c== :: Overlay -> Overlay -> Bool
Eq, forall x. Rep Overlay x -> Overlay
forall x. Overlay -> Rep Overlay x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep Overlay x -> Overlay
$cfrom :: forall x. Overlay -> Rep Overlay x
Generic)
  deriving newtype (InputNormalizer -> Decoder Overlay
forall a. (InputNormalizer -> Decoder a) -> FromDhall a
autoWith :: InputNormalizer -> Decoder Overlay
$cautoWith :: InputNormalizer -> Decoder Overlay
FromDhall, InputNormalizer -> Encoder Overlay
forall a. (InputNormalizer -> Encoder a) -> ToDhall a
injectWith :: InputNormalizer -> Encoder Overlay
$cinjectWith :: InputNormalizer -> Encoder Overlay
ToDhall)