module Horizon.Spec.Types.TarballSource (TarballSource(MkTarballSource), fromTarballSource) where

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


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