{-# LANGUAGE LambdaCase #-}

module Cardano.CLI.Types.Errors.StakeAddressRegistrationError
  ( StakeAddressRegistrationError (..)
  )
where

import           Cardano.Api

data StakeAddressRegistrationError = StakeAddressRegistrationDepositRequired
  deriving Int -> StakeAddressRegistrationError -> ShowS
[StakeAddressRegistrationError] -> ShowS
StakeAddressRegistrationError -> String
(Int -> StakeAddressRegistrationError -> ShowS)
-> (StakeAddressRegistrationError -> String)
-> ([StakeAddressRegistrationError] -> ShowS)
-> Show StakeAddressRegistrationError
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> StakeAddressRegistrationError -> ShowS
showsPrec :: Int -> StakeAddressRegistrationError -> ShowS
$cshow :: StakeAddressRegistrationError -> String
show :: StakeAddressRegistrationError -> String
$cshowList :: [StakeAddressRegistrationError] -> ShowS
showList :: [StakeAddressRegistrationError] -> ShowS
Show

instance Error StakeAddressRegistrationError where
  prettyError :: forall ann. StakeAddressRegistrationError -> Doc ann
prettyError = \case
    StakeAddressRegistrationError
StakeAddressRegistrationDepositRequired -> Doc ann
"Stake address deposit required."