{-# LANGUAGE DeriveAnyClass #-}

module Hercules.API.Build.DerivationInfo.DerivationOutput where

import Hercules.API.Prelude

data DerivationOutput = DerivationOutput
  { DerivationOutput -> Text
outputName :: Text,
    DerivationOutput -> Text
outputPath :: Text
  }
  deriving ((forall x. DerivationOutput -> Rep DerivationOutput x)
-> (forall x. Rep DerivationOutput x -> DerivationOutput)
-> Generic DerivationOutput
forall x. Rep DerivationOutput x -> DerivationOutput
forall x. DerivationOutput -> Rep DerivationOutput x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DerivationOutput x -> DerivationOutput
$cfrom :: forall x. DerivationOutput -> Rep DerivationOutput x
Generic, Int -> DerivationOutput -> ShowS
[DerivationOutput] -> ShowS
DerivationOutput -> String
(Int -> DerivationOutput -> ShowS)
-> (DerivationOutput -> String)
-> ([DerivationOutput] -> ShowS)
-> Show DerivationOutput
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DerivationOutput] -> ShowS
$cshowList :: [DerivationOutput] -> ShowS
show :: DerivationOutput -> String
$cshow :: DerivationOutput -> String
showsPrec :: Int -> DerivationOutput -> ShowS
$cshowsPrec :: Int -> DerivationOutput -> ShowS
Show, DerivationOutput -> DerivationOutput -> Bool
(DerivationOutput -> DerivationOutput -> Bool)
-> (DerivationOutput -> DerivationOutput -> Bool)
-> Eq DerivationOutput
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DerivationOutput -> DerivationOutput -> Bool
$c/= :: DerivationOutput -> DerivationOutput -> Bool
== :: DerivationOutput -> DerivationOutput -> Bool
$c== :: DerivationOutput -> DerivationOutput -> Bool
Eq, DerivationOutput -> ()
(DerivationOutput -> ()) -> NFData DerivationOutput
forall a. (a -> ()) -> NFData a
rnf :: DerivationOutput -> ()
$crnf :: DerivationOutput -> ()
NFData, [DerivationOutput] -> Encoding
[DerivationOutput] -> Value
DerivationOutput -> Encoding
DerivationOutput -> Value
(DerivationOutput -> Value)
-> (DerivationOutput -> Encoding)
-> ([DerivationOutput] -> Value)
-> ([DerivationOutput] -> Encoding)
-> ToJSON DerivationOutput
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> ToJSON a
toEncodingList :: [DerivationOutput] -> Encoding
$ctoEncodingList :: [DerivationOutput] -> Encoding
toJSONList :: [DerivationOutput] -> Value
$ctoJSONList :: [DerivationOutput] -> Value
toEncoding :: DerivationOutput -> Encoding
$ctoEncoding :: DerivationOutput -> Encoding
toJSON :: DerivationOutput -> Value
$ctoJSON :: DerivationOutput -> Value
ToJSON, Value -> Parser [DerivationOutput]
Value -> Parser DerivationOutput
(Value -> Parser DerivationOutput)
-> (Value -> Parser [DerivationOutput])
-> FromJSON DerivationOutput
forall a.
(Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a
parseJSONList :: Value -> Parser [DerivationOutput]
$cparseJSONList :: Value -> Parser [DerivationOutput]
parseJSON :: Value -> Parser DerivationOutput
$cparseJSON :: Value -> Parser DerivationOutput
FromJSON, Proxy DerivationOutput -> Declare (Definitions Schema) NamedSchema
(Proxy DerivationOutput
 -> Declare (Definitions Schema) NamedSchema)
-> ToSchema DerivationOutput
forall a.
(Proxy a -> Declare (Definitions Schema) NamedSchema) -> ToSchema a
declareNamedSchema :: Proxy DerivationOutput -> Declare (Definitions Schema) NamedSchema
$cdeclareNamedSchema :: Proxy DerivationOutput -> Declare (Definitions Schema) NamedSchema
ToSchema)