module Horizon.Spec.Types.Compiler (Compiler(MkCompiler), fromCompiler) where import Data.Kind (Type) import Data.String (IsString) import Data.Text (Text) import Dhall (FromDhall, ToDhall) type Compiler :: Type newtype Compiler = MkCompiler { Compiler -> Text fromCompiler :: Text } deriving stock (Compiler -> Compiler -> Bool forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: Compiler -> Compiler -> Bool $c/= :: Compiler -> Compiler -> Bool == :: Compiler -> Compiler -> Bool $c== :: Compiler -> Compiler -> Bool Eq, Int -> Compiler -> ShowS [Compiler] -> ShowS Compiler -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [Compiler] -> ShowS $cshowList :: [Compiler] -> ShowS show :: Compiler -> String $cshow :: Compiler -> String showsPrec :: Int -> Compiler -> ShowS $cshowsPrec :: Int -> Compiler -> ShowS Show) deriving newtype (InputNormalizer -> Decoder Compiler forall a. (InputNormalizer -> Decoder a) -> FromDhall a autoWith :: InputNormalizer -> Decoder Compiler $cautoWith :: InputNormalizer -> Decoder Compiler FromDhall, InputNormalizer -> Encoder Compiler forall a. (InputNormalizer -> Encoder a) -> ToDhall a injectWith :: InputNormalizer -> Encoder Compiler $cinjectWith :: InputNormalizer -> Encoder Compiler ToDhall, String -> Compiler forall a. (String -> a) -> IsString a fromString :: String -> Compiler $cfromString :: String -> Compiler IsString)