cardano-api:internal
Safe HaskellNone
LanguageHaskell2010

Cardano.Api.Pretty

Synopsis

Documentation

type Ann = AnsiStyle Source #

Ann is the prettyprinter annotation for cardano-api and cardano-cli to enable the printing of colored output. This is a type alias for AnsiStyle.

data Doc ann #

Instances

Instances details
Functor Doc 
Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> Doc a -> Doc b Source #

(<$) :: a -> Doc b -> Doc a Source #

IsString (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

fromString :: String -> Doc ann Source #

Monoid (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

mempty :: Doc ann Source #

mappend :: Doc ann -> Doc ann -> Doc ann Source #

mconcat :: [Doc ann] -> Doc ann Source #

Semigroup (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

(<>) :: Doc ann -> Doc ann -> Doc ann Source #

sconcat :: NonEmpty (Doc ann) -> Doc ann Source #

stimes :: Integral b => b -> Doc ann -> Doc ann Source #

Generic (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

type Rep (Doc ann) = D1 ('MetaData "Doc" "Prettyprinter.Internal" "prettyprinter-1.7.1-7xklMuBeQ2QJha3MfIsTQQ" 'False) (((C1 ('MetaCons "Fail" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Empty" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Char" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Char)))) :+: (C1 ('MetaCons "Text" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "Line" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FlatAlt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)))))) :+: ((C1 ('MetaCons "Cat" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))) :+: (C1 ('MetaCons "Nest" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))) :+: C1 ('MetaCons "Union" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))))) :+: ((C1 ('MetaCons "Column" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Int -> Doc ann))) :+: C1 ('MetaCons "WithPageWidth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PageWidth -> Doc ann)))) :+: (C1 ('MetaCons "Nesting" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Int -> Doc ann))) :+: C1 ('MetaCons "Annotated" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ann) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)))))))

Methods

from :: Doc ann -> Rep (Doc ann) x Source #

to :: Rep (Doc ann) x -> Doc ann Source #

Show (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> Doc ann -> ShowS Source #

show :: Doc ann -> String Source #

showList :: [Doc ann] -> ShowS Source #

type Rep (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

type Rep (Doc ann) = D1 ('MetaData "Doc" "Prettyprinter.Internal" "prettyprinter-1.7.1-7xklMuBeQ2QJha3MfIsTQQ" 'False) (((C1 ('MetaCons "Fail" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Empty" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Char" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Char)))) :+: (C1 ('MetaCons "Text" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "Line" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FlatAlt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)))))) :+: ((C1 ('MetaCons "Cat" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))) :+: (C1 ('MetaCons "Nest" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))) :+: C1 ('MetaCons "Union" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))))) :+: ((C1 ('MetaCons "Column" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Int -> Doc ann))) :+: C1 ('MetaCons "WithPageWidth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PageWidth -> Doc ann)))) :+: (C1 ('MetaCons "Nesting" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Int -> Doc ann))) :+: C1 ('MetaCons "Annotated" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ann) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)))))))

class Pretty a where #

Minimal complete definition

pretty

Methods

pretty :: a -> Doc ann #

prettyList :: [a] -> Doc ann #

Instances

Instances details
Pretty Void 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Void -> Doc ann #

prettyList :: [Void] -> Doc ann #

Pretty Int16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int16 -> Doc ann #

prettyList :: [Int16] -> Doc ann #

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann #

prettyList :: [Int32] -> Doc ann #

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann #

prettyList :: [Int64] -> Doc ann #

Pretty Int8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int8 -> Doc ann #

prettyList :: [Int8] -> Doc ann #

Pretty Word16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word16 -> Doc ann #

prettyList :: [Word16] -> Doc ann #

Pretty Word32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word32 -> Doc ann #

prettyList :: [Word32] -> Doc ann #

Pretty Word64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word64 -> Doc ann #

prettyList :: [Word64] -> Doc ann #

Pretty Word8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word8 -> Doc ann #

prettyList :: [Word8] -> Doc ann #

Pretty AnyCardanoEra Source # 
Instance details

Defined in Cardano.Api.Eras.Core

Methods

pretty :: AnyCardanoEra -> Doc ann #

prettyList :: [AnyCardanoEra] -> Doc ann #

Pretty TxOutInAnyEra Source # 
Instance details

Defined in Cardano.Api.Tx.Body

Methods

pretty :: TxOutInAnyEra -> Doc ann #

prettyList :: [TxOutInAnyEra] -> Doc ann #

Pretty TxIn Source # 
Instance details

Defined in Cardano.Api.TxIn

Methods

pretty :: TxIn -> Doc ann #

prettyList :: [TxIn] -> Doc ann #

Pretty Coin Source # 
Instance details

Defined in Cardano.Api.Orphans

Methods

pretty :: Coin -> Doc ann #

prettyList :: [Coin] -> Doc ann #

Pretty MuxError Source # 
Instance details

Defined in Cardano.Api.Orphans

Methods

pretty :: MuxError -> Doc ann #

prettyList :: [MuxError] -> Doc ann #

Pretty Ann 
Instance details

Defined in PlutusCore.Annotation

Methods

pretty :: Ann -> Doc ann #

prettyList :: [Ann] -> Doc ann #

Pretty SrcSpan 
Instance details

Defined in PlutusCore.Annotation

Methods

pretty :: SrcSpan -> Doc ann #

prettyList :: [SrcSpan] -> Doc ann #

Pretty SrcSpans 
Instance details

Defined in PlutusCore.Annotation

Methods

pretty :: SrcSpans -> Doc ann #

prettyList :: [SrcSpans] -> Doc ann #

Pretty BuiltinError 
Instance details

Defined in PlutusCore.Builtin.Result

Methods

pretty :: BuiltinError -> Doc ann #

prettyList :: [BuiltinError] -> Doc ann #

Pretty UnliftingError 
Instance details

Defined in PlutusCore.Builtin.Result

Methods

pretty :: UnliftingError -> Doc ann #

prettyList :: [UnliftingError] -> Doc ann #

Pretty UnliftingEvaluationError 
Instance details

Defined in PlutusCore.Builtin.Result

Pretty Data 
Instance details

Defined in PlutusCore.Data

Methods

pretty :: Data -> Doc ann #

prettyList :: [Data] -> Doc ann #

Pretty FreeVariableError 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Pretty Index 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

pretty :: Index -> Doc ann #

prettyList :: [Index] -> Doc ann #

Pretty DefaultFun 
Instance details

Defined in PlutusCore.Default.Builtins

Methods

pretty :: DefaultFun -> Doc ann #

prettyList :: [DefaultFun] -> Doc ann #

Pretty ParserError 
Instance details

Defined in PlutusCore.Error

Methods

pretty :: ParserError -> Doc ann #

prettyList :: [ParserError] -> Doc ann #

Pretty ParserErrorBundle 
Instance details

Defined in PlutusCore.Error

Pretty CkUserError 
Instance details

Defined in PlutusCore.Evaluation.Machine.Ck

Methods

pretty :: CkUserError -> Doc ann #

prettyList :: [CkUserError] -> Doc ann #

Pretty CostModelApplyError 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostModelInterface

Pretty CostModelApplyWarn 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostModelInterface

Pretty ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Methods

pretty :: ExBudget -> Doc ann #

prettyList :: [ExBudget] -> Doc ann #

Pretty ExRestrictingBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Pretty ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

pretty :: ExCPU -> Doc ann #

prettyList :: [ExCPU] -> Doc ann #

Pretty ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

pretty :: ExMemory -> Doc ann #

prettyList :: [ExMemory] -> Doc ann #

Pretty Unique 
Instance details

Defined in PlutusCore.Name.Unique

Methods

pretty :: Unique -> Doc ann #

prettyList :: [Unique] -> Doc ann #

Pretty Version 
Instance details

Defined in PlutusCore.Version

Methods

pretty :: Version -> Doc ann #

prettyList :: [Version] -> Doc ann #

Pretty CountingSt 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

pretty :: CountingSt -> Doc ann #

prettyList :: [CountingSt] -> Doc ann #

Pretty RestrictingSt 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

pretty :: RestrictingSt -> Doc ann #

prettyList :: [RestrictingSt] -> Doc ann #

Pretty CekUserError 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Methods

pretty :: CekUserError -> Doc ann #

prettyList :: [CekUserError] -> Doc ann #

Pretty DatatypeComponent 
Instance details

Defined in PlutusIR.Compiler.Provenance

Methods

pretty :: DatatypeComponent -> Doc ann #

prettyList :: [DatatypeComponent] -> Doc ann #

Pretty GeneratedKind 
Instance details

Defined in PlutusIR.Compiler.Provenance

Methods

pretty :: GeneratedKind -> Doc ann #

prettyList :: [GeneratedKind] -> Doc ann #

Pretty EvaluationError 
Instance details

Defined in PlutusLedgerApi.Common.Eval

Pretty MajorProtocolVersion 
Instance details

Defined in PlutusLedgerApi.Common.ProtocolVersions

Pretty ScriptDecodeError 
Instance details

Defined in PlutusLedgerApi.Common.SerialisedScript

Pretty PlutusLedgerLanguage 
Instance details

Defined in PlutusLedgerApi.Common.Versions

Pretty Address 
Instance details

Defined in PlutusLedgerApi.V1.Address

Methods

pretty :: Address -> Doc ann #

prettyList :: [Address] -> Doc ann #

Pretty LedgerBytes 
Instance details

Defined in PlutusLedgerApi.V1.Bytes

Methods

pretty :: LedgerBytes -> Doc ann #

prettyList :: [LedgerBytes] -> Doc ann #

Pretty ScriptContext 
Instance details

Defined in PlutusLedgerApi.V1.Contexts

Methods

pretty :: ScriptContext -> Doc ann #

prettyList :: [ScriptContext] -> Doc ann #

Pretty ScriptPurpose 
Instance details

Defined in PlutusLedgerApi.V1.Contexts

Methods

pretty :: ScriptPurpose -> Doc ann #

prettyList :: [ScriptPurpose] -> Doc ann #

Pretty TxInInfo 
Instance details

Defined in PlutusLedgerApi.V1.Contexts

Methods

pretty :: TxInInfo -> Doc ann #

prettyList :: [TxInInfo] -> Doc ann #

Pretty TxInfo 
Instance details

Defined in PlutusLedgerApi.V1.Contexts

Methods

pretty :: TxInfo -> Doc ann #

prettyList :: [TxInfo] -> Doc ann #

Pretty Credential 
Instance details

Defined in PlutusLedgerApi.V1.Credential

Methods

pretty :: Credential -> Doc ann #

prettyList :: [Credential] -> Doc ann #

Pretty StakingCredential 
Instance details

Defined in PlutusLedgerApi.V1.Credential

Pretty PubKeyHash

using hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Crypto

Methods

pretty :: PubKeyHash -> Doc ann #

prettyList :: [PubKeyHash] -> Doc ann #

Pretty DCert 
Instance details

Defined in PlutusLedgerApi.V1.DCert

Methods

pretty :: DCert -> Doc ann #

prettyList :: [DCert] -> Doc ann #

Pretty AssetClass 
Instance details

Defined in PlutusLedgerApi.V1.Data.Value

Methods

pretty :: AssetClass -> Doc ann #

prettyList :: [AssetClass] -> Doc ann #

Pretty CurrencySymbol

using hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Data.Value

Methods

pretty :: CurrencySymbol -> Doc ann #

prettyList :: [CurrencySymbol] -> Doc ann #

Pretty Lovelace 
Instance details

Defined in PlutusLedgerApi.V1.Data.Value

Methods

pretty :: Lovelace -> Doc ann #

prettyList :: [Lovelace] -> Doc ann #

Pretty TokenName 
Instance details

Defined in PlutusLedgerApi.V1.Data.Value

Methods

pretty :: TokenName -> Doc ann #

prettyList :: [TokenName] -> Doc ann #

Pretty Value 
Instance details

Defined in PlutusLedgerApi.V1.Data.Value

Methods

pretty :: Value -> Doc ann #

prettyList :: [Value] -> Doc ann #

Pretty Context 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

pretty :: Context -> Doc ann #

prettyList :: [Context] -> Doc ann #

Pretty Datum 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

pretty :: Datum -> Doc ann #

prettyList :: [Datum] -> Doc ann #

Pretty DatumHash

using hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

pretty :: DatumHash -> Doc ann #

prettyList :: [DatumHash] -> Doc ann #

Pretty Redeemer 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

pretty :: Redeemer -> Doc ann #

prettyList :: [Redeemer] -> Doc ann #

Pretty RedeemerHash

using hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

pretty :: RedeemerHash -> Doc ann #

prettyList :: [RedeemerHash] -> Doc ann #

Pretty ScriptHash

using hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Scripts

Methods

pretty :: ScriptHash -> Doc ann #

prettyList :: [ScriptHash] -> Doc ann #

Pretty POSIXTime 
Instance details

Defined in PlutusLedgerApi.V1.Time

Methods

pretty :: POSIXTime -> Doc ann #

prettyList :: [POSIXTime] -> Doc ann #

Pretty TxId

using hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

pretty :: TxId -> Doc ann #

prettyList :: [TxId] -> Doc ann #

Pretty TxOut 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

pretty :: TxOut -> Doc ann #

prettyList :: [TxOut] -> Doc ann #

Pretty TxOutRef 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

pretty :: TxOutRef -> Doc ann #

prettyList :: [TxOutRef] -> Doc ann #

Pretty AssetClass 
Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

pretty :: AssetClass -> Doc ann #

prettyList :: [AssetClass] -> Doc ann #

Pretty CurrencySymbol

using hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

pretty :: CurrencySymbol -> Doc ann #

prettyList :: [CurrencySymbol] -> Doc ann #

Pretty Lovelace 
Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

pretty :: Lovelace -> Doc ann #

prettyList :: [Lovelace] -> Doc ann #

Pretty TokenName 
Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

pretty :: TokenName -> Doc ann #

prettyList :: [TokenName] -> Doc ann #

Pretty Value 
Instance details

Defined in PlutusLedgerApi.V1.Value

Methods

pretty :: Value -> Doc ann #

prettyList :: [Value] -> Doc ann #

Pretty ScriptContext 
Instance details

Defined in PlutusLedgerApi.V2.Contexts

Methods

pretty :: ScriptContext -> Doc ann #

prettyList :: [ScriptContext] -> Doc ann #

Pretty TxInInfo 
Instance details

Defined in PlutusLedgerApi.V2.Contexts

Methods

pretty :: TxInInfo -> Doc ann #

prettyList :: [TxInInfo] -> Doc ann #

Pretty TxInfo 
Instance details

Defined in PlutusLedgerApi.V2.Contexts

Methods

pretty :: TxInfo -> Doc ann #

prettyList :: [TxInfo] -> Doc ann #

Pretty OutputDatum 
Instance details

Defined in PlutusLedgerApi.V2.Tx

Methods

pretty :: OutputDatum -> Doc ann #

prettyList :: [OutputDatum] -> Doc ann #

Pretty TxOut 
Instance details

Defined in PlutusLedgerApi.V2.Tx

Methods

pretty :: TxOut -> Doc ann #

prettyList :: [TxOut] -> Doc ann #

Pretty ChangedParameters 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Pretty ColdCommitteeCredential 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Pretty Committee 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: Committee -> Doc ann #

prettyList :: [Committee] -> Doc ann #

Pretty Constitution 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: Constitution -> Doc ann #

prettyList :: [Constitution] -> Doc ann #

Pretty DRep 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: DRep -> Doc ann #

prettyList :: [DRep] -> Doc ann #

Pretty DRepCredential 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: DRepCredential -> Doc ann #

prettyList :: [DRepCredential] -> Doc ann #

Pretty Delegatee 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: Delegatee -> Doc ann #

prettyList :: [Delegatee] -> Doc ann #

Pretty GovernanceAction 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Pretty GovernanceActionId 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Pretty HotCommitteeCredential 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Pretty ProposalProcedure 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Pretty ProtocolVersion 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Pretty ScriptContext 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: ScriptContext -> Doc ann #

prettyList :: [ScriptContext] -> Doc ann #

Pretty ScriptInfo 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: ScriptInfo -> Doc ann #

prettyList :: [ScriptInfo] -> Doc ann #

Pretty ScriptPurpose 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: ScriptPurpose -> Doc ann #

prettyList :: [ScriptPurpose] -> Doc ann #

Pretty TxCert 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: TxCert -> Doc ann #

prettyList :: [TxCert] -> Doc ann #

Pretty TxInInfo 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: TxInInfo -> Doc ann #

prettyList :: [TxInInfo] -> Doc ann #

Pretty TxInfo 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: TxInfo -> Doc ann #

prettyList :: [TxInfo] -> Doc ann #

Pretty Vote 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: Vote -> Doc ann #

prettyList :: [Vote] -> Doc ann #

Pretty Voter 
Instance details

Defined in PlutusLedgerApi.V3.Contexts

Methods

pretty :: Voter -> Doc ann #

prettyList :: [Voter] -> Doc ann #

Pretty TxId

using hex encoding

Instance details

Defined in PlutusLedgerApi.V3.Tx

Methods

pretty :: TxId -> Doc ann #

prettyList :: [TxId] -> Doc ann #

Pretty TxOutRef 
Instance details

Defined in PlutusLedgerApi.V3.Tx

Methods

pretty :: TxOutRef -> Doc ann #

prettyList :: [TxOutRef] -> Doc ann #

Pretty ScriptEvaluationData 
Instance details

Defined in PlutusLedgerApi.Test.EvaluationEvent

Methods

pretty :: ScriptEvaluationData -> Doc ann #

prettyList :: [ScriptEvaluationData] -> Doc ann #

Pretty ScriptEvaluationEvent 
Instance details

Defined in PlutusLedgerApi.Test.EvaluationEvent

Methods

pretty :: ScriptEvaluationEvent -> Doc ann #

prettyList :: [ScriptEvaluationEvent] -> Doc ann #

Pretty ScriptEvaluationResult 
Instance details

Defined in PlutusLedgerApi.Test.EvaluationEvent

Methods

pretty :: ScriptEvaluationResult -> Doc ann #

prettyList :: [ScriptEvaluationResult] -> Doc ann #

Pretty UnexpectedEvaluationResult 
Instance details

Defined in PlutusLedgerApi.Test.EvaluationEvent

Methods

pretty :: UnexpectedEvaluationResult -> Doc ann #

prettyList :: [UnexpectedEvaluationResult] -> Doc ann #

Pretty BuiltinBLS12_381_G1_Element 
Instance details

Defined in PlutusTx.Builtins.Internal

Pretty BuiltinBLS12_381_G2_Element 
Instance details

Defined in PlutusTx.Builtins.Internal

Pretty BuiltinBLS12_381_MlResult 
Instance details

Defined in PlutusTx.Builtins.Internal

Pretty BuiltinByteString 
Instance details

Defined in PlutusTx.Builtins.Internal

Pretty BuiltinData 
Instance details

Defined in PlutusTx.Builtins.Internal

Methods

pretty :: BuiltinData -> Doc ann #

prettyList :: [BuiltinData] -> Doc ann #

Pretty CovLoc 
Instance details

Defined in PlutusTx.Coverage

Methods

pretty :: CovLoc -> Doc ann #

prettyList :: [CovLoc] -> Doc ann #

Pretty CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

Pretty CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

Pretty CoverageReport 
Instance details

Defined in PlutusTx.Coverage

Methods

pretty :: CoverageReport -> Doc ann #

prettyList :: [CoverageReport] -> Doc ann #

Pretty Metadata 
Instance details

Defined in PlutusTx.Coverage

Methods

pretty :: Metadata -> Doc ann #

prettyList :: [Metadata] -> Doc ann #

Pretty Rational 
Instance details

Defined in PlutusTx.Ratio

Methods

pretty :: Rational -> Doc ann #

prettyList :: [Rational] -> Doc ann #

Pretty Text 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

Pretty Text 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

Pretty Integer 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Integer -> Doc ann #

prettyList :: [Integer] -> Doc ann #

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Natural -> Doc ann #

prettyList :: [Natural] -> Doc ann #

Pretty () 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: () -> Doc ann #

prettyList :: [()] -> Doc ann #

Pretty Bool 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Bool -> Doc ann #

prettyList :: [Bool] -> Doc ann #

Pretty Char 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann #

prettyList :: [Char] -> Doc ann #

Pretty Double 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Double -> Doc ann #

prettyList :: [Double] -> Doc ann #

Pretty Float 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Float -> Doc ann #

prettyList :: [Float] -> Doc ann #

Pretty Int 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int -> Doc ann #

prettyList :: [Int] -> Doc ann #

Pretty Word 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word -> Doc ann #

prettyList :: [Word] -> Doc ann #

Pretty a => Pretty (Identity a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Identity a -> Doc ann #

prettyList :: [Identity a] -> Doc ann #

Pretty a => Pretty (NonEmpty a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: NonEmpty a -> Doc ann #

prettyList :: [NonEmpty a] -> Doc ann #

Pretty (ShelleyBasedEra era) Source # 
Instance details

Defined in Cardano.Api.Eon.ShelleyBasedEra

Methods

pretty :: ShelleyBasedEra era -> Doc ann #

prettyList :: [ShelleyBasedEra era] -> Doc ann #

Pretty (CardanoEra era) Source # 
Instance details

Defined in Cardano.Api.Eras.Core

Methods

pretty :: CardanoEra era -> Doc ann #

prettyList :: [CardanoEra era] -> Doc ann #

Pretty (DeprecatedEra era) Source # 
Instance details

Defined in Cardano.Api.Experimental.Eras

Methods

pretty :: DeprecatedEra era -> Doc ann #

prettyList :: [DeprecatedEra era] -> Doc ann #

Pretty (Era era) Source # 
Instance details

Defined in Cardano.Api.Experimental.Eras

Methods

pretty :: Era era -> Doc ann #

prettyList :: [Era era] -> Doc ann #

Pretty (Some Era) Source # 
Instance details

Defined in Cardano.Api.Experimental.Eras

Methods

pretty :: Some Era -> Doc ann #

prettyList :: [Some Era] -> Doc ann #

Show a => Pretty (ShowOf a) Source # 
Instance details

Defined in Cardano.Api.Via.ShowOf

Methods

pretty :: ShowOf a -> Doc ann #

prettyList :: [ShowOf a] -> Doc ann #

Pretty (PlutusScriptContext l) => Pretty (LegacyPlutusArgs l) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Methods

pretty :: LegacyPlutusArgs l -> Doc ann #

prettyList :: [LegacyPlutusArgs l] -> Doc ann #

Pretty (PlutusArgs 'PlutusV1) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Pretty (PlutusArgs 'PlutusV2) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Pretty (PlutusArgs 'PlutusV3) 
Instance details

Defined in Cardano.Ledger.Plutus.Language

Pretty (BuiltinSemanticsVariant DefaultFun) 
Instance details

Defined in PlutusCore.Default.Builtins

Pretty a => Pretty (Normalized a) 
Instance details

Defined in PlutusCore.Core.Type

Methods

pretty :: Normalized a -> Doc ann #

prettyList :: [Normalized a] -> Doc ann #

Pretty (DefaultUni a)

This always pretty-prints parens around type applications (e.g. (list bool)) and doesn't pretty-print them otherwise (e.g. integer).

Instance details

Defined in PlutusCore.Default.Universe

Methods

pretty :: DefaultUni a -> Doc ann #

prettyList :: [DefaultUni a] -> Doc ann #

Pretty ann => Pretty (UniqueError ann) 
Instance details

Defined in PlutusCore.Error

Methods

pretty :: UniqueError ann -> Doc ann0 #

prettyList :: [UniqueError ann] -> Doc ann0 #

PrettyClassic a => Pretty (EvaluationResult a) 
Instance details

Defined in PlutusCore.Evaluation.Result

Methods

pretty :: EvaluationResult a -> Doc ann #

prettyList :: [EvaluationResult a] -> Doc ann #

PrettyReadable a => Pretty (AsReadable a) 
Instance details

Defined in PlutusCore.Pretty.Readable

Methods

pretty :: AsReadable a -> Doc ann #

prettyList :: [AsReadable a] -> Doc ann #

Pretty (SomeTypeIn DefaultUni) 
Instance details

Defined in PlutusCore.Default.Universe

(Show fun, Ord fun) => Pretty (CekExTally fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

pretty :: CekExTally fun -> Doc ann #

prettyList :: [CekExTally fun] -> Doc ann #

(Show fun, Ord fun) => Pretty (TallyingSt fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

pretty :: TallyingSt fun -> Doc ann #

prettyList :: [TallyingSt fun] -> Doc ann #

Show fun => Pretty (ExBudgetCategory fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Methods

pretty :: ExBudgetCategory fun -> Doc ann #

prettyList :: [ExBudgetCategory fun] -> Doc ann #

Pretty a => Pretty (Provenance a) 
Instance details

Defined in PlutusIR.Compiler.Provenance

Methods

pretty :: Provenance a -> Doc ann #

prettyList :: [Provenance a] -> Doc ann #

Pretty a => Pretty (Extended a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Methods

pretty :: Extended a -> Doc ann #

prettyList :: [Extended a] -> Doc ann #

Pretty a => Pretty (Interval a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Methods

pretty :: Interval a -> Doc ann #

prettyList :: [Interval a] -> Doc ann #

Pretty a => Pretty (LowerBound a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Methods

pretty :: LowerBound a -> Doc ann #

prettyList :: [LowerBound a] -> Doc ann #

Pretty a => Pretty (UpperBound a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Methods

pretty :: UpperBound a -> Doc ann #

prettyList :: [UpperBound a] -> Doc ann #

Show a => Pretty (PrettyShow a) 
Instance details

Defined in Prettyprinter.Extras

Methods

pretty :: PrettyShow a -> Doc ann #

prettyList :: [PrettyShow a] -> Doc ann #

Pretty a => Pretty (Maybe a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann #

prettyList :: [Maybe a] -> Doc ann #

Pretty a => Pretty [a] 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: [a] -> Doc ann #

prettyList :: [[a]] -> Doc ann #

(Pretty operational, Pretty structural) => Pretty (EvaluationError operational structural) 
Instance details

Defined in PlutusCore.Evaluation.Error

Methods

pretty :: EvaluationError operational structural -> Doc ann #

prettyList :: [EvaluationError operational structural] -> Doc ann #

(Pretty err, Pretty cause) => Pretty (ErrorWithCause err cause) 
Instance details

Defined in PlutusCore.Evaluation.ErrorWithCause

Methods

pretty :: ErrorWithCause err cause -> Doc ann #

prettyList :: [ErrorWithCause err cause] -> Doc ann #

(Foldable f, Pretty a) => Pretty (PrettyFoldable f a) 
Instance details

Defined in Prettyprinter.Extras

Methods

pretty :: PrettyFoldable f a -> Doc ann #

prettyList :: [PrettyFoldable f a] -> Doc ann #

(Pretty k, Pretty v) => Pretty (Map k v) 
Instance details

Defined in PlutusTx.AssocMap

Methods

pretty :: Map k v -> Doc ann #

prettyList :: [Map k v] -> Doc ann #

DefaultPrettyBy config a => Pretty (AttachDefaultPrettyConfig config a) 
Instance details

Defined in Text.PrettyBy.Internal

Methods

pretty :: AttachDefaultPrettyConfig config a -> Doc ann #

prettyList :: [AttachDefaultPrettyConfig config a] -> Doc ann #

PrettyBy config a => Pretty (AttachPrettyConfig config a) 
Instance details

Defined in Text.PrettyBy.Internal

Methods

pretty :: AttachPrettyConfig config a -> Doc ann #

prettyList :: [AttachPrettyConfig config a] -> Doc ann #

(Pretty a1, Pretty a2) => Pretty (a1, a2) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: (a1, a2) -> Doc ann #

prettyList :: [(a1, a2)] -> Doc ann #

Pretty a => Pretty (Const a b) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Const a b -> Doc ann #

prettyList :: [Const a b] -> Doc ann #

(PrettyUni uni, Pretty fun, Pretty ann) => Pretty (Error uni fun ann) 
Instance details

Defined in PlutusIR.Error

Methods

pretty :: Error uni fun ann -> Doc ann0 #

prettyList :: [Error uni fun ann] -> Doc ann0 #

(Pretty a1, Pretty a2, Pretty a3) => Pretty (a1, a2, a3) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: (a1, a2, a3) -> Doc ann #

prettyList :: [(a1, a2, a3)] -> Doc ann #

newtype ShowOf a Source #

Constructors

ShowOf a 

Instances

Instances details
Show a => ToJSON (ShowOf a) Source # 
Instance details

Defined in Cardano.Api.Via.ShowOf

Methods

toJSON :: ShowOf a -> Value #

toEncoding :: ShowOf a -> Encoding #

toJSONList :: [ShowOf a] -> Value #

toEncodingList :: [ShowOf a] -> Encoding #

omitField :: ShowOf a -> Bool #

Show a => ToJSONKey (ShowOf a) Source # 
Instance details

Defined in Cardano.Api.Via.ShowOf

Methods

toJSONKey :: ToJSONKeyFunction (ShowOf a)

toJSONKeyList :: ToJSONKeyFunction [ShowOf a]

Show a => Show (ShowOf a) Source # 
Instance details

Defined in Cardano.Api.Via.ShowOf

Show a => Pretty (ShowOf a) Source # 
Instance details

Defined in Cardano.Api.Via.ShowOf

Methods

pretty :: ShowOf a -> Doc ann #

prettyList :: [ShowOf a] -> Doc ann #

docToLazyText :: Doc AnsiStyle -> Text Source #

docToText :: Doc AnsiStyle -> Text Source #

docToString :: Doc AnsiStyle -> String Source #

pshow :: Show a => a -> Doc ann Source #

Short hand for viaShow.

prettyException :: Exception a => a -> Doc ann Source #

Short hand for pretty . displayException

hsep :: [Doc ann] -> Doc ann #

vsep :: [Doc ann] -> Doc ann #

(<+>) :: Doc ann -> Doc ann -> Doc ann #

black :: Doc AnsiStyle -> Doc AnsiStyle Source #

red :: Doc AnsiStyle -> Doc AnsiStyle Source #

green :: Doc AnsiStyle -> Doc AnsiStyle Source #

yellow :: Doc AnsiStyle -> Doc AnsiStyle Source #

blue :: Doc AnsiStyle -> Doc AnsiStyle Source #

magenta :: Doc AnsiStyle -> Doc AnsiStyle Source #

cyan :: Doc AnsiStyle -> Doc AnsiStyle Source #

white :: Doc AnsiStyle -> Doc AnsiStyle Source #