{-# LANGUAGE GeneralisedNewtypeDeriving #-}
module Cardano.CLI.Byron.Commands
( ByronCommand (..)
, NodeCmd (..)
, VerificationKeyFile (..)
, NewVerificationKeyFile (..)
, CertificateFile (..)
, NewCertificateFile (..)
) where
import Cardano.Prelude
import Cardano.Chain.Slotting (EpochNumber (..))
import Cardano.Chain.Update (InstallerHash (..), ProtocolVersion (..),
SoftwareVersion (..), SystemTag (..))
import Cardano.Api.Typed (NetworkId)
import Cardano.CLI.Byron.UpdateProposal
import Cardano.CLI.Byron.Genesis
import Cardano.CLI.Byron.Key
import Cardano.CLI.Byron.Tx
import Cardano.CLI.Types
import Cardano.Chain.Common (Address (..))
import Cardano.Chain.UTxO (TxIn (..), TxOut (..))
data ByronCommand =
NodeCmd NodeCmd
| Genesis
NewDirectory
GenesisParameters
CardanoEra
| PrintGenesisHash
GenesisFile
| Keygen
CardanoEra
NewSigningKeyFile
PasswordRequirement
| ToVerification
CardanoEra
SigningKeyFile
NewVerificationKeyFile
| PrettySigningKeyPublic
CardanoEra
SigningKeyFile
| MigrateDelegateKeyFrom
CardanoEra
SigningKeyFile
CardanoEra
NewSigningKeyFile
| PrintSigningKeyAddress
CardanoEra
NetworkId
SigningKeyFile
| IssueDelegationCertificate
NetworkId
CardanoEra
EpochNumber
SigningKeyFile
VerificationKeyFile
NewCertificateFile
| CheckDelegation
NetworkId
CertificateFile
VerificationKeyFile
VerificationKeyFile
| GetLocalNodeTip
NetworkId
| SubmitTx
NetworkId
TxFile
| SpendGenesisUTxO
GenesisFile
NetworkId
CardanoEra
NewTxFile
SigningKeyFile
Address
(NonEmpty TxOut)
| SpendUTxO
NetworkId
CardanoEra
NewTxFile
SigningKeyFile
(NonEmpty TxIn)
(NonEmpty TxOut)
| ValidateCBOR
CBORObject
FilePath
| PrettyPrintCBOR
FilePath
deriving Int -> ByronCommand -> ShowS
[ByronCommand] -> ShowS
ByronCommand -> String
(Int -> ByronCommand -> ShowS)
-> (ByronCommand -> String)
-> ([ByronCommand] -> ShowS)
-> Show ByronCommand
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ByronCommand] -> ShowS
$cshowList :: [ByronCommand] -> ShowS
show :: ByronCommand -> String
$cshow :: ByronCommand -> String
showsPrec :: Int -> ByronCommand -> ShowS
$cshowsPrec :: Int -> ByronCommand -> ShowS
Show
data NodeCmd = CreateVote
NetworkId
SigningKeyFile
FilePath
Bool
FilePath
| UpdateProposal
NetworkId
SigningKeyFile
ProtocolVersion
SoftwareVersion
SystemTag
InstallerHash
FilePath
[ParametersToUpdate]
| SubmitUpdateProposal
NetworkId
FilePath
| SubmitVote
NetworkId
FilePath
deriving Int -> NodeCmd -> ShowS
[NodeCmd] -> ShowS
NodeCmd -> String
(Int -> NodeCmd -> ShowS)
-> (NodeCmd -> String) -> ([NodeCmd] -> ShowS) -> Show NodeCmd
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [NodeCmd] -> ShowS
$cshowList :: [NodeCmd] -> ShowS
show :: NodeCmd -> String
$cshow :: NodeCmd -> String
showsPrec :: Int -> NodeCmd -> ShowS
$cshowsPrec :: Int -> NodeCmd -> ShowS
Show
newtype NewCertificateFile
= NewCertificateFile { NewCertificateFile -> String
nFp :: FilePath }
deriving (NewCertificateFile -> NewCertificateFile -> Bool
(NewCertificateFile -> NewCertificateFile -> Bool)
-> (NewCertificateFile -> NewCertificateFile -> Bool)
-> Eq NewCertificateFile
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: NewCertificateFile -> NewCertificateFile -> Bool
$c/= :: NewCertificateFile -> NewCertificateFile -> Bool
== :: NewCertificateFile -> NewCertificateFile -> Bool
$c== :: NewCertificateFile -> NewCertificateFile -> Bool
Eq, Int -> NewCertificateFile -> ShowS
[NewCertificateFile] -> ShowS
NewCertificateFile -> String
(Int -> NewCertificateFile -> ShowS)
-> (NewCertificateFile -> String)
-> ([NewCertificateFile] -> ShowS)
-> Show NewCertificateFile
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [NewCertificateFile] -> ShowS
$cshowList :: [NewCertificateFile] -> ShowS
show :: NewCertificateFile -> String
$cshow :: NewCertificateFile -> String
showsPrec :: Int -> NewCertificateFile -> ShowS
$cshowsPrec :: Int -> NewCertificateFile -> ShowS
Show, String -> NewCertificateFile
(String -> NewCertificateFile) -> IsString NewCertificateFile
forall a. (String -> a) -> IsString a
fromString :: String -> NewCertificateFile
$cfromString :: String -> NewCertificateFile
IsString)