Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- type Ann = AnsiStyle
- data Doc ann
- class Pretty a where
- pretty :: a -> Doc ann
- prettyList :: [a] -> Doc ann
- newtype ShowOf a = ShowOf a
- docToLazyText :: Doc AnsiStyle -> Text
- docToText :: Doc AnsiStyle -> Text
- docToString :: Doc AnsiStyle -> String
- pshow :: Show a => a -> Doc ann
- prettyException :: Exception a => a -> Doc ann
- hsep :: [Doc ann] -> Doc ann
- vsep :: [Doc ann] -> Doc ann
- (<+>) :: Doc ann -> Doc ann -> Doc ann
- black :: Doc AnsiStyle -> Doc AnsiStyle
- red :: Doc AnsiStyle -> Doc AnsiStyle
- green :: Doc AnsiStyle -> Doc AnsiStyle
- yellow :: Doc AnsiStyle -> Doc AnsiStyle
- blue :: Doc AnsiStyle -> Doc AnsiStyle
- magenta :: Doc AnsiStyle -> Doc AnsiStyle
- cyan :: Doc AnsiStyle -> Doc AnsiStyle
- white :: Doc AnsiStyle -> Doc AnsiStyle
Documentation
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.
Instances
Instances
Pretty Void | |
Defined in Prettyprinter.Internal | |
Pretty Int16 | |
Defined in Prettyprinter.Internal | |
Pretty Int32 | |
Defined in Prettyprinter.Internal | |
Pretty Int64 | |
Defined in Prettyprinter.Internal | |
Pretty Int8 | |
Defined in Prettyprinter.Internal | |
Pretty Word16 | |
Defined in Prettyprinter.Internal | |
Pretty Word32 | |
Defined in Prettyprinter.Internal | |
Pretty Word64 | |
Defined in Prettyprinter.Internal | |
Pretty Word8 | |
Defined in Prettyprinter.Internal | |
Pretty AnyCardanoEra Source # | |
Defined in Cardano.Api.Eras.Core pretty :: AnyCardanoEra -> Doc ann # prettyList :: [AnyCardanoEra] -> Doc ann # | |
Pretty TxOutInAnyEra Source # | |
Defined in Cardano.Api.Tx.Body pretty :: TxOutInAnyEra -> Doc ann # prettyList :: [TxOutInAnyEra] -> Doc ann # | |
Pretty TxIn Source # | |
Defined in Cardano.Api.TxIn | |
Pretty Coin Source # | |
Defined in Cardano.Api.Orphans | |
Pretty MuxError Source # | |
Defined in Cardano.Api.Orphans | |
Pretty Ann | |
Defined in PlutusCore.Annotation | |
Pretty SrcSpan | |
Defined in PlutusCore.Annotation | |
Pretty SrcSpans | |
Defined in PlutusCore.Annotation | |
Pretty BuiltinError | |
Defined in PlutusCore.Builtin.Result pretty :: BuiltinError -> Doc ann # prettyList :: [BuiltinError] -> Doc ann # | |
Pretty UnliftingError | |
Defined in PlutusCore.Builtin.Result pretty :: UnliftingError -> Doc ann # prettyList :: [UnliftingError] -> Doc ann # | |
Pretty UnliftingEvaluationError | |
Defined in PlutusCore.Builtin.Result pretty :: UnliftingEvaluationError -> Doc ann # prettyList :: [UnliftingEvaluationError] -> Doc ann # | |
Pretty Data | |
Defined in PlutusCore.Data | |
Pretty FreeVariableError | |
Defined in PlutusCore.DeBruijn.Internal pretty :: FreeVariableError -> Doc ann # prettyList :: [FreeVariableError] -> Doc ann # | |
Pretty Index | |
Defined in PlutusCore.DeBruijn.Internal | |
Pretty DefaultFun | |
Defined in PlutusCore.Default.Builtins pretty :: DefaultFun -> Doc ann # prettyList :: [DefaultFun] -> Doc ann # | |
Pretty ParserError | |
Defined in PlutusCore.Error pretty :: ParserError -> Doc ann # prettyList :: [ParserError] -> Doc ann # | |
Pretty ParserErrorBundle | |
Defined in PlutusCore.Error pretty :: ParserErrorBundle -> Doc ann # prettyList :: [ParserErrorBundle] -> Doc ann # | |
Pretty CkUserError | |
Defined in PlutusCore.Evaluation.Machine.Ck | |
Pretty CostModelApplyError | |
Defined in PlutusCore.Evaluation.Machine.CostModelInterface pretty :: CostModelApplyError -> Doc ann # prettyList :: [CostModelApplyError] -> Doc ann # | |
Pretty CostModelApplyWarn | |
Defined in PlutusCore.Evaluation.Machine.CostModelInterface pretty :: CostModelApplyWarn -> Doc ann # prettyList :: [CostModelApplyWarn] -> Doc ann # | |
Pretty ExBudget | |
Defined in PlutusCore.Evaluation.Machine.ExBudget | |
Pretty ExRestrictingBudget | |
Defined in PlutusCore.Evaluation.Machine.ExBudget pretty :: ExRestrictingBudget -> Doc ann # prettyList :: [ExRestrictingBudget] -> Doc ann # | |
Pretty ExCPU | |
Defined in PlutusCore.Evaluation.Machine.ExMemory | |
Pretty ExMemory | |
Defined in PlutusCore.Evaluation.Machine.ExMemory | |
Pretty Unique | |
Defined in PlutusCore.Name.Unique | |
Pretty Version | |
Defined in PlutusCore.Version | |
Pretty CountingSt | |
Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode pretty :: CountingSt -> Doc ann # prettyList :: [CountingSt] -> Doc ann # | |
Pretty RestrictingSt | |
Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode pretty :: RestrictingSt -> Doc ann # prettyList :: [RestrictingSt] -> Doc ann # | |
Pretty CekUserError | |
Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal pretty :: CekUserError -> Doc ann # prettyList :: [CekUserError] -> Doc ann # | |
Pretty DatatypeComponent | |
Defined in PlutusIR.Compiler.Provenance | |
Pretty GeneratedKind | |
Defined in PlutusIR.Compiler.Provenance | |
Pretty EvaluationError | |
Defined in PlutusLedgerApi.Common.Eval pretty :: EvaluationError -> Doc ann # prettyList :: [EvaluationError] -> Doc ann # | |
Pretty MajorProtocolVersion | |
Defined in PlutusLedgerApi.Common.ProtocolVersions pretty :: MajorProtocolVersion -> Doc ann # prettyList :: [MajorProtocolVersion] -> Doc ann # | |
Pretty ScriptDecodeError | |
Defined in PlutusLedgerApi.Common.SerialisedScript pretty :: ScriptDecodeError -> Doc ann # prettyList :: [ScriptDecodeError] -> Doc ann # | |
Pretty PlutusLedgerLanguage | |
Defined in PlutusLedgerApi.Common.Versions pretty :: PlutusLedgerLanguage -> Doc ann # prettyList :: [PlutusLedgerLanguage] -> Doc ann # | |
Pretty Address | |
Defined in PlutusLedgerApi.V1.Address | |
Pretty LedgerBytes | |
Defined in PlutusLedgerApi.V1.Bytes pretty :: LedgerBytes -> Doc ann # prettyList :: [LedgerBytes] -> Doc ann # | |
Pretty ScriptContext | |
Defined in PlutusLedgerApi.V1.Contexts pretty :: ScriptContext -> Doc ann # prettyList :: [ScriptContext] -> Doc ann # | |
Pretty ScriptPurpose | |
Defined in PlutusLedgerApi.V1.Contexts pretty :: ScriptPurpose -> Doc ann # prettyList :: [ScriptPurpose] -> Doc ann # | |
Pretty TxInInfo | |
Defined in PlutusLedgerApi.V1.Contexts | |
Pretty TxInfo | |
Defined in PlutusLedgerApi.V1.Contexts | |
Pretty Credential | |
Defined in PlutusLedgerApi.V1.Credential pretty :: Credential -> Doc ann # prettyList :: [Credential] -> Doc ann # | |
Pretty StakingCredential | |
Defined in PlutusLedgerApi.V1.Credential pretty :: StakingCredential -> Doc ann # prettyList :: [StakingCredential] -> Doc ann # | |
Pretty PubKeyHash | using hex encoding |
Defined in PlutusLedgerApi.V1.Crypto pretty :: PubKeyHash -> Doc ann # prettyList :: [PubKeyHash] -> Doc ann # | |
Pretty DCert | |
Defined in PlutusLedgerApi.V1.DCert | |
Pretty ScriptContext | |
Defined in PlutusLedgerApi.V1.Data.Contexts pretty :: ScriptContext -> Doc ann # prettyList :: [ScriptContext] -> Doc ann # | |
Pretty ScriptPurpose | |
Defined in PlutusLedgerApi.V1.Data.Contexts pretty :: ScriptPurpose -> Doc ann # prettyList :: [ScriptPurpose] -> Doc ann # | |
Pretty TxInInfo | |
Defined in PlutusLedgerApi.V1.Data.Contexts | |
Pretty TxInfo | |
Defined in PlutusLedgerApi.V1.Data.Contexts | |
Pretty TxId | using hex encoding |
Defined in PlutusLedgerApi.V1.Data.Tx | |
Pretty TxOut | |
Defined in PlutusLedgerApi.V1.Data.Tx | |
Pretty TxOutRef | |
Defined in PlutusLedgerApi.V1.Data.Tx | |
Pretty AssetClass | |
Defined in PlutusLedgerApi.V1.Data.Value pretty :: AssetClass -> Doc ann # prettyList :: [AssetClass] -> Doc ann # | |
Pretty CurrencySymbol | using hex encoding |
Defined in PlutusLedgerApi.V1.Data.Value pretty :: CurrencySymbol -> Doc ann # prettyList :: [CurrencySymbol] -> Doc ann # | |
Pretty Lovelace | |
Defined in PlutusLedgerApi.V1.Data.Value | |
Pretty TokenName | |
Defined in PlutusLedgerApi.V1.Data.Value | |
Pretty Value | |
Defined in PlutusLedgerApi.V1.Data.Value | |
Pretty Context | |
Defined in PlutusLedgerApi.V1.Scripts | |
Pretty Datum | |
Defined in PlutusLedgerApi.V1.Scripts | |
Pretty DatumHash | using hex encoding |
Defined in PlutusLedgerApi.V1.Scripts | |
Pretty Redeemer | |
Defined in PlutusLedgerApi.V1.Scripts | |
Pretty RedeemerHash | using hex encoding |
Defined in PlutusLedgerApi.V1.Scripts pretty :: RedeemerHash -> Doc ann # prettyList :: [RedeemerHash] -> Doc ann # | |
Pretty ScriptHash | using hex encoding |
Defined in PlutusLedgerApi.V1.Scripts pretty :: ScriptHash -> Doc ann # prettyList :: [ScriptHash] -> Doc ann # | |
Pretty POSIXTime | |
Defined in PlutusLedgerApi.V1.Time | |
Pretty TxId | using hex encoding |
Defined in PlutusLedgerApi.V1.Tx | |
Pretty TxOut | |
Defined in PlutusLedgerApi.V1.Tx | |
Pretty TxOutRef | |
Defined in PlutusLedgerApi.V1.Tx | |
Pretty AssetClass | |
Defined in PlutusLedgerApi.V1.Value pretty :: AssetClass -> Doc ann # prettyList :: [AssetClass] -> Doc ann # | |
Pretty CurrencySymbol | using hex encoding |
Defined in PlutusLedgerApi.V1.Value pretty :: CurrencySymbol -> Doc ann # prettyList :: [CurrencySymbol] -> Doc ann # | |
Pretty Lovelace | |
Defined in PlutusLedgerApi.V1.Value | |
Pretty TokenName | |
Defined in PlutusLedgerApi.V1.Value | |
Pretty Value | |
Defined in PlutusLedgerApi.V1.Value | |
Pretty ScriptContext | |
Defined in PlutusLedgerApi.V2.Contexts pretty :: ScriptContext -> Doc ann # prettyList :: [ScriptContext] -> Doc ann # | |
Pretty TxInInfo | |
Defined in PlutusLedgerApi.V2.Contexts | |
Pretty TxInfo | |
Defined in PlutusLedgerApi.V2.Contexts | |
Pretty ScriptContext | |
Defined in PlutusLedgerApi.V2.Data.Contexts pretty :: ScriptContext -> Doc ann # prettyList :: [ScriptContext] -> Doc ann # | |
Pretty TxInInfo | |
Defined in PlutusLedgerApi.V2.Data.Contexts | |
Pretty TxInfo | |
Defined in PlutusLedgerApi.V2.Data.Contexts | |
Pretty OutputDatum | |
Defined in PlutusLedgerApi.V2.Data.Tx pretty :: OutputDatum -> Doc ann # prettyList :: [OutputDatum] -> Doc ann # | |
Pretty TxOut | |
Defined in PlutusLedgerApi.V2.Data.Tx | |
Pretty OutputDatum | |
Defined in PlutusLedgerApi.V2.Tx pretty :: OutputDatum -> Doc ann # prettyList :: [OutputDatum] -> Doc ann # | |
Pretty TxOut | |
Defined in PlutusLedgerApi.V2.Tx | |
Pretty ChangedParameters | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: ChangedParameters -> Doc ann # prettyList :: [ChangedParameters] -> Doc ann # | |
Pretty ColdCommitteeCredential | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: ColdCommitteeCredential -> Doc ann # prettyList :: [ColdCommitteeCredential] -> Doc ann # | |
Pretty Committee | |
Defined in PlutusLedgerApi.V3.Contexts | |
Pretty Constitution | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: Constitution -> Doc ann # prettyList :: [Constitution] -> Doc ann # | |
Pretty DRep | |
Defined in PlutusLedgerApi.V3.Contexts | |
Pretty DRepCredential | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: DRepCredential -> Doc ann # prettyList :: [DRepCredential] -> Doc ann # | |
Pretty Delegatee | |
Defined in PlutusLedgerApi.V3.Contexts | |
Pretty GovernanceAction | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: GovernanceAction -> Doc ann # prettyList :: [GovernanceAction] -> Doc ann # | |
Pretty GovernanceActionId | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: GovernanceActionId -> Doc ann # prettyList :: [GovernanceActionId] -> Doc ann # | |
Pretty HotCommitteeCredential | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: HotCommitteeCredential -> Doc ann # prettyList :: [HotCommitteeCredential] -> Doc ann # | |
Pretty ProposalProcedure | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: ProposalProcedure -> Doc ann # prettyList :: [ProposalProcedure] -> Doc ann # | |
Pretty ProtocolVersion | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: ProtocolVersion -> Doc ann # prettyList :: [ProtocolVersion] -> Doc ann # | |
Pretty ScriptContext | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: ScriptContext -> Doc ann # prettyList :: [ScriptContext] -> Doc ann # | |
Pretty ScriptInfo | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: ScriptInfo -> Doc ann # prettyList :: [ScriptInfo] -> Doc ann # | |
Pretty ScriptPurpose | |
Defined in PlutusLedgerApi.V3.Contexts pretty :: ScriptPurpose -> Doc ann # prettyList :: [ScriptPurpose] -> Doc ann # | |
Pretty TxCert | |
Defined in PlutusLedgerApi.V3.Contexts | |
Pretty TxInInfo | |
Defined in PlutusLedgerApi.V3.Contexts | |
Pretty TxInfo | |
Defined in PlutusLedgerApi.V3.Contexts | |
Pretty Vote | |
Defined in PlutusLedgerApi.V3.Contexts | |
Pretty Voter | |
Defined in PlutusLedgerApi.V3.Contexts | |
Pretty ChangedParameters | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: ChangedParameters -> Doc ann # prettyList :: [ChangedParameters] -> Doc ann # | |
Pretty ColdCommitteeCredential | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: ColdCommitteeCredential -> Doc ann # prettyList :: [ColdCommitteeCredential] -> Doc ann # | |
Pretty Committee | |
Defined in PlutusLedgerApi.V3.Data.Contexts | |
Pretty Constitution | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: Constitution -> Doc ann # prettyList :: [Constitution] -> Doc ann # | |
Pretty DRep | |
Defined in PlutusLedgerApi.V3.Data.Contexts | |
Pretty DRepCredential | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: DRepCredential -> Doc ann # prettyList :: [DRepCredential] -> Doc ann # | |
Pretty Delegatee | |
Defined in PlutusLedgerApi.V3.Data.Contexts | |
Pretty GovernanceAction | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: GovernanceAction -> Doc ann # prettyList :: [GovernanceAction] -> Doc ann # | |
Pretty GovernanceActionId | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: GovernanceActionId -> Doc ann # prettyList :: [GovernanceActionId] -> Doc ann # | |
Pretty HotCommitteeCredential | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: HotCommitteeCredential -> Doc ann # prettyList :: [HotCommitteeCredential] -> Doc ann # | |
Pretty ProposalProcedure | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: ProposalProcedure -> Doc ann # prettyList :: [ProposalProcedure] -> Doc ann # | |
Pretty ProtocolVersion | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: ProtocolVersion -> Doc ann # prettyList :: [ProtocolVersion] -> Doc ann # | |
Pretty ScriptContext | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: ScriptContext -> Doc ann # prettyList :: [ScriptContext] -> Doc ann # | |
Pretty ScriptInfo | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: ScriptInfo -> Doc ann # prettyList :: [ScriptInfo] -> Doc ann # | |
Pretty ScriptPurpose | |
Defined in PlutusLedgerApi.V3.Data.Contexts pretty :: ScriptPurpose -> Doc ann # prettyList :: [ScriptPurpose] -> Doc ann # | |
Pretty TxCert | |
Defined in PlutusLedgerApi.V3.Data.Contexts | |
Pretty TxInInfo | |
Defined in PlutusLedgerApi.V3.Data.Contexts | |
Pretty TxInfo | |
Defined in PlutusLedgerApi.V3.Data.Contexts | |
Pretty Vote | |
Defined in PlutusLedgerApi.V3.Data.Contexts | |
Pretty Voter | |
Defined in PlutusLedgerApi.V3.Data.Contexts | |
Pretty TxId | using hex encoding |
Defined in PlutusLedgerApi.V3.Tx | |
Pretty TxOutRef | |
Defined in PlutusLedgerApi.V3.Tx | |
Pretty ScriptEvaluationData | |
Defined in PlutusLedgerApi.Test.EvaluationEvent | |
Pretty ScriptEvaluationEvent | |
Defined in PlutusLedgerApi.Test.EvaluationEvent | |
Pretty ScriptEvaluationResult | |
Defined in PlutusLedgerApi.Test.EvaluationEvent | |
Pretty UnexpectedEvaluationResult | |
Defined in PlutusLedgerApi.Test.EvaluationEvent | |
Pretty BuiltinBLS12_381_G1_Element | |
Defined in PlutusTx.Builtins.Internal pretty :: BuiltinBLS12_381_G1_Element -> Doc ann # prettyList :: [BuiltinBLS12_381_G1_Element] -> Doc ann # | |
Pretty BuiltinBLS12_381_G2_Element | |
Defined in PlutusTx.Builtins.Internal pretty :: BuiltinBLS12_381_G2_Element -> Doc ann # prettyList :: [BuiltinBLS12_381_G2_Element] -> Doc ann # | |
Pretty BuiltinBLS12_381_MlResult | |
Defined in PlutusTx.Builtins.Internal pretty :: BuiltinBLS12_381_MlResult -> Doc ann # prettyList :: [BuiltinBLS12_381_MlResult] -> Doc ann # | |
Pretty BuiltinByteString | |
Defined in PlutusTx.Builtins.Internal pretty :: BuiltinByteString -> Doc ann # prettyList :: [BuiltinByteString] -> Doc ann # | |
Pretty BuiltinData | |
Defined in PlutusTx.Builtins.Internal pretty :: BuiltinData -> Doc ann # prettyList :: [BuiltinData] -> Doc ann # | |
Pretty CovLoc | |
Defined in PlutusTx.Coverage | |
Pretty CoverageAnnotation | |
Defined in PlutusTx.Coverage pretty :: CoverageAnnotation -> Doc ann # prettyList :: [CoverageAnnotation] -> Doc ann # | |
Pretty CoverageMetadata | |
Defined in PlutusTx.Coverage pretty :: CoverageMetadata -> Doc ann # prettyList :: [CoverageMetadata] -> Doc ann # | |
Pretty CoverageReport | |
Defined in PlutusTx.Coverage pretty :: CoverageReport -> Doc ann # prettyList :: [CoverageReport] -> Doc ann # | |
Pretty Metadata | |
Defined in PlutusTx.Coverage | |
Pretty Rational | |
Defined in PlutusTx.Ratio | |
Pretty Text | |
Defined in Prettyprinter.Internal | |
Pretty Text | |
Defined in Prettyprinter.Internal | |
Pretty Integer | |
Defined in Prettyprinter.Internal | |
Pretty Natural | |
Defined in Prettyprinter.Internal | |
Pretty () | |
Defined in Prettyprinter.Internal | |
Pretty Bool | |
Defined in Prettyprinter.Internal | |
Pretty Char | |
Defined in Prettyprinter.Internal | |
Pretty Double | |
Defined in Prettyprinter.Internal | |
Pretty Float | |
Defined in Prettyprinter.Internal | |
Pretty Int | |
Defined in Prettyprinter.Internal | |
Pretty Word | |
Defined in Prettyprinter.Internal | |
Pretty a => Pretty (Identity a) | |
Defined in Prettyprinter.Internal | |
Pretty a => Pretty (NonEmpty a) | |
Defined in Prettyprinter.Internal | |
Pretty (ShelleyBasedEra era) Source # | |
Defined in Cardano.Api.Eon.ShelleyBasedEra pretty :: ShelleyBasedEra era -> Doc ann # prettyList :: [ShelleyBasedEra era] -> Doc ann # | |
Pretty (CardanoEra era) Source # | |
Defined in Cardano.Api.Eras.Core pretty :: CardanoEra era -> Doc ann # prettyList :: [CardanoEra era] -> Doc ann # | |
Pretty (DeprecatedEra era) Source # | |
Defined in Cardano.Api.Experimental.Eras pretty :: DeprecatedEra era -> Doc ann # prettyList :: [DeprecatedEra era] -> Doc ann # | |
Pretty (Era era) Source # | |
Defined in Cardano.Api.Experimental.Eras | |
Show a => Pretty (ShowOf a) Source # | |
Defined in Cardano.Api.Via.ShowOf | |
Pretty (PlutusScriptContext l) => Pretty (LegacyPlutusArgs l) | |
Defined in Cardano.Ledger.Plutus.Language pretty :: LegacyPlutusArgs l -> Doc ann # prettyList :: [LegacyPlutusArgs l] -> Doc ann # | |
Pretty (PlutusArgs 'PlutusV1) | |
Defined in Cardano.Ledger.Plutus.Language pretty :: PlutusArgs 'PlutusV1 -> Doc ann # prettyList :: [PlutusArgs 'PlutusV1] -> Doc ann # | |
Pretty (PlutusArgs 'PlutusV2) | |
Defined in Cardano.Ledger.Plutus.Language pretty :: PlutusArgs 'PlutusV2 -> Doc ann # prettyList :: [PlutusArgs 'PlutusV2] -> Doc ann # | |
Pretty (PlutusArgs 'PlutusV3) | |
Defined in Cardano.Ledger.Plutus.Language pretty :: PlutusArgs 'PlutusV3 -> Doc ann # prettyList :: [PlutusArgs 'PlutusV3] -> Doc ann # | |
Pretty (BuiltinSemanticsVariant DefaultFun) | |
Defined in PlutusCore.Default.Builtins pretty :: BuiltinSemanticsVariant DefaultFun -> Doc ann # prettyList :: [BuiltinSemanticsVariant DefaultFun] -> Doc ann # | |
Pretty a => Pretty (Normalized a) | |
Defined in PlutusCore.Core.Type pretty :: Normalized a -> Doc ann # prettyList :: [Normalized a] -> Doc ann # | |
Pretty (DefaultUni a) | This always pretty-prints parens around type applications (e.g. |
Defined in PlutusCore.Default.Universe pretty :: DefaultUni a -> Doc ann # prettyList :: [DefaultUni a] -> Doc ann # | |
Pretty ann => Pretty (UniqueError ann) | |
Defined in PlutusCore.Error pretty :: UniqueError ann -> Doc ann0 # prettyList :: [UniqueError ann] -> Doc ann0 # | |
PrettyClassic a => Pretty (EvaluationResult a) | |
Defined in PlutusCore.Evaluation.Result pretty :: EvaluationResult a -> Doc ann # prettyList :: [EvaluationResult a] -> Doc ann # | |
PrettyReadable a => Pretty (AsReadable a) | |
Defined in PlutusCore.Pretty.Readable pretty :: AsReadable a -> Doc ann # prettyList :: [AsReadable a] -> Doc ann # | |
Pretty (SomeTypeIn DefaultUni) | |
Defined in PlutusCore.Default.Universe pretty :: SomeTypeIn DefaultUni -> Doc ann # prettyList :: [SomeTypeIn DefaultUni] -> Doc ann # | |
(Show fun, Ord fun) => Pretty (CekExTally fun) | |
Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode pretty :: CekExTally fun -> Doc ann # prettyList :: [CekExTally fun] -> Doc ann # | |
(Show fun, Ord fun) => Pretty (TallyingSt fun) | |
Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode pretty :: TallyingSt fun -> Doc ann # prettyList :: [TallyingSt fun] -> Doc ann # | |
Show fun => Pretty (ExBudgetCategory fun) | |
Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal pretty :: ExBudgetCategory fun -> Doc ann # prettyList :: [ExBudgetCategory fun] -> Doc ann # | |
Pretty a => Pretty (Provenance a) | |
Defined in PlutusIR.Compiler.Provenance | |
Pretty a => Pretty (Extended a) | |
Defined in PlutusLedgerApi.V1.Interval | |
Pretty a => Pretty (Interval a) | |
Defined in PlutusLedgerApi.V1.Interval | |
Pretty a => Pretty (LowerBound a) | |
Defined in PlutusLedgerApi.V1.Interval pretty :: LowerBound a -> Doc ann # prettyList :: [LowerBound a] -> Doc ann # | |
Pretty a => Pretty (UpperBound a) | |
Defined in PlutusLedgerApi.V1.Interval pretty :: UpperBound a -> Doc ann # prettyList :: [UpperBound a] -> Doc ann # | |
Show a => Pretty (PrettyShow a) | |
Defined in Prettyprinter.Extras | |
Pretty a => Pretty (Maybe a) | |
Defined in Prettyprinter.Internal | |
Pretty a => Pretty [a] | |
Defined in Prettyprinter.Internal | |
Pretty (Some Era) Source # | |
(Pretty structural, Pretty operational) => Pretty (EvaluationError structural operational) | |
Defined in PlutusCore.Evaluation.Error pretty :: EvaluationError structural operational -> Doc ann # prettyList :: [EvaluationError structural operational] -> Doc ann # | |
(Pretty err, Pretty cause) => Pretty (ErrorWithCause err cause) | |
Defined in PlutusCore.Evaluation.ErrorWithCause pretty :: ErrorWithCause err cause -> Doc ann # prettyList :: [ErrorWithCause err cause] -> Doc ann # | |
(Foldable f, Pretty a) => Pretty (PrettyFoldable f a) | |
Defined in Prettyprinter.Extras | |
(Pretty k, Pretty v) => Pretty (Map k v) | |
Defined in PlutusTx.AssocMap | |
DefaultPrettyBy config a => Pretty (AttachDefaultPrettyConfig config a) | |
Defined in Text.PrettyBy.Internal | |
PrettyBy config a => Pretty (AttachPrettyConfig config a) | |
Defined in Text.PrettyBy.Internal pretty :: AttachPrettyConfig config a -> Doc ann # prettyList :: [AttachPrettyConfig config a] -> Doc ann # | |
(Pretty a1, Pretty a2) => Pretty (a1, a2) | |
Defined in Prettyprinter.Internal | |
Pretty a => Pretty (Const a b) | |
Defined in Prettyprinter.Internal | |
(PrettyUni uni, Pretty fun, Pretty ann) => Pretty (Error uni fun ann) | |
Defined in PlutusIR.Error | |
(Pretty a1, Pretty a2, Pretty a3) => Pretty (a1, a2, a3) | |
Defined in Prettyprinter.Internal |
ShowOf a |
Instances
Show a => ToJSON (ShowOf a) Source # | |
Defined in Cardano.Api.Via.ShowOf | |
Show a => ToJSONKey (ShowOf a) Source # | |
Defined in Cardano.Api.Via.ShowOf toJSONKey :: ToJSONKeyFunction (ShowOf a) toJSONKeyList :: ToJSONKeyFunction [ShowOf a] | |
Show a => Show (ShowOf a) Source # | |
Show a => Pretty (ShowOf a) Source # | |
Defined in Cardano.Api.Via.ShowOf |
docToLazyText :: Doc AnsiStyle -> Text Source #
docToString :: Doc AnsiStyle -> String Source #
prettyException :: Exception a => a -> Doc ann Source #
Short hand for pretty
. displayException