| Pretty Bool | >>> pretty True
True
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Char | Instead of (pretty 'n'), consider using line as a more readable
alternative. >>> pretty 'f' <> pretty 'o' <> pretty 'o'
foo
>>> pretty ("string" :: String)
string
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Double | >>> pretty (exp 1 :: Double)
2.71828182845904...
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Float | >>> pretty (pi :: Float)
3.1415927
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Int | >>> pretty (123 :: Int)
123
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Int8 | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Int16 | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Int32 | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Int64 | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Integer | >>> pretty (2^123 :: Integer)
10633823966279326983230456482242756608
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Natural | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Word | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Word8 | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Word16 | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Word32 | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Word64 | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty () | >>> pretty ()
()
The argument is not used: >>> pretty (error "Strict?" :: ())
()
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Text | Automatically converts all newlines to line. >>> pretty ("hello\nworld" :: Text)
hello
world
Note that line can be undone by group: >>> group (pretty ("hello\nworld" :: Text))
hello world
Manually use hardline if you definitely want newlines. |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Text | (lazy Text instance, identical to the strict version) |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty Void | Finding a good example for printing something that does not exist is hard,
so here is an example of printing a list full of nothing. >>> pretty ([] :: [Void])
[]
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty CostModelApplyError | |
Instance detailsDefined in PlutusCore.Evaluation.Machine.CostModelInterface |
| Pretty LogLevel | |
Instance detailsDefined in Control.Monad.Freer.Extras.Log |
| Pretty CountingSt | |
Instance detailsDefined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode |
| Pretty RestrictingSt | |
Instance detailsDefined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode |
| Pretty CekUserError | |
Instance detailsDefined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal |
| Pretty DefaultFun | |
Instance detailsDefined in PlutusCore.Default.Builtins |
| Pretty ParseError | |
Instance detailsDefined in PlutusCore.Error |
| Pretty UnliftingError | |
Instance detailsDefined in PlutusCore.Evaluation.Machine.Exception |
| Pretty ExBudget | |
Instance detailsDefined in PlutusCore.Evaluation.Machine.ExBudget |
| Pretty ExRestrictingBudget | |
Instance detailsDefined in PlutusCore.Evaluation.Machine.ExBudget |
| Pretty ExMemory | |
Instance detailsDefined in PlutusCore.Evaluation.Machine.ExMemory |
| Pretty ExCPU | |
Instance detailsDefined in PlutusCore.Evaluation.Machine.ExMemory |
| Pretty Index | |
Instance detailsDefined in PlutusCore.DeBruijn.Internal |
| Pretty FreeVariableError | |
Instance detailsDefined in PlutusCore.DeBruijn.Internal |
| Pretty Unique | |
Instance detailsDefined in PlutusCore.Name |
| Pretty Data | |
Instance detailsDefined in PlutusCore.Data |
| Pretty TxInInfo | |
Instance detailsDefined in Plutus.V2.Ledger.Contexts |
| Pretty TxInfo | |
Instance detailsDefined in Plutus.V2.Ledger.Contexts |
| Pretty ScriptContext | |
Instance detailsDefined in Plutus.V2.Ledger.Contexts |
| Pretty TxInInfo | |
Instance detailsDefined in Plutus.V1.Ledger.Contexts |
| Pretty ScriptPurpose | |
Instance detailsDefined in Plutus.V1.Ledger.Contexts |
| Pretty TxInfo | |
Instance detailsDefined in Plutus.V1.Ledger.Contexts |
| Pretty ScriptContext | |
Instance detailsDefined in Plutus.V1.Ledger.Contexts |
| Pretty OutputDatum | |
Instance detailsDefined in Plutus.V2.Ledger.Tx |
| Pretty TxOut | |
Instance detailsDefined in Plutus.V2.Ledger.Tx |
| Pretty TxId | |
Instance detailsDefined in Plutus.V1.Ledger.Tx |
| Pretty TxOutRef | |
Instance detailsDefined in Plutus.V1.Ledger.Tx |
| Pretty TxIn | |
Instance detailsDefined in Plutus.V1.Ledger.Tx |
| Pretty TxOut | |
Instance detailsDefined in Plutus.V1.Ledger.Tx |
| Pretty Address | |
Instance detailsDefined in Plutus.V1.Ledger.Address |
| Pretty DCert | |
Instance detailsDefined in Plutus.V1.Ledger.DCert |
| Pretty StakingCredential | |
Instance detailsDefined in Plutus.V1.Ledger.Credential |
| Pretty Credential | |
Instance detailsDefined in Plutus.V1.Ledger.Credential |
| Pretty PubKeyHash | |
Instance detailsDefined in Plutus.V1.Ledger.Crypto |
| Pretty CurrencySymbol | |
Instance detailsDefined in Plutus.V1.Ledger.Value |
| Pretty TokenName | |
Instance detailsDefined in Plutus.V1.Ledger.Value |
| Pretty AssetClass | |
Instance detailsDefined in Plutus.V1.Ledger.Value |
| Pretty Value | |
Instance detailsDefined in Plutus.V1.Ledger.Value |
| Pretty Validator | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty Datum | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty Redeemer | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty MintingPolicy | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty StakeValidator | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty ScriptHash | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty ValidatorHash | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty DatumHash | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty RedeemerHash | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty MintingPolicyHash | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty StakeValidatorHash | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty Context | |
Instance detailsDefined in Plutus.V1.Ledger.Scripts |
| Pretty LedgerBytes | |
Instance detailsDefined in Plutus.V1.Ledger.Bytes |
| Pretty POSIXTime | |
Instance detailsDefined in Plutus.V1.Ledger.Time |
| Pretty ProtocolVersion | |
Instance detailsDefined in Plutus.ApiCommon |
| Pretty EvaluationError | |
Instance detailsDefined in Plutus.ApiCommon |
| Pretty BuiltinData | |
Instance detailsDefined in PlutusTx.Builtins.Internal |
| Pretty BuiltinByteString | |
Instance detailsDefined in PlutusTx.Builtins.Internal |
| Pretty ConnectionError | |
Instance detailsDefined in Plutus.Script.Utils.V1.Typed.Scripts.Validators |
| Pretty LiftError | |
Instance detailsDefined in PlutusTx.Lift.Class |
| Pretty CoverageReport | |
Instance detailsDefined in PlutusTx.Coverage |
| Pretty CoverageAnnotation | |
Instance detailsDefined in PlutusTx.Coverage |
| Pretty Metadata | |
Instance detailsDefined in PlutusTx.Coverage |
| Pretty CoverageMetadata | |
Instance detailsDefined in PlutusTx.Coverage |
| Pretty CovLoc | |
Instance detailsDefined in PlutusTx.Coverage |
| Pretty Ada Source # | |
Instance detailsDefined in Ledger.Ada |
| Pretty CkUserError | |
Instance detailsDefined in PlutusCore.Evaluation.Machine.Ck |
| Pretty Slot Source # | |
Instance detailsDefined in Ledger.Slot |
| Pretty Signature Source # | |
Instance detailsDefined in Ledger.Crypto |
| Pretty PubKey Source # | |
Instance detailsDefined in Ledger.Crypto |
| Pretty PrivateKey Source # | |
Instance detailsDefined in Ledger.Crypto |
| Pretty PaymentPubKey Source # | |
Instance detailsDefined in Ledger.Address |
| Pretty PaymentPubKeyHash Source # | |
Instance detailsDefined in Ledger.Address |
| Pretty StakePubKey Source # | |
Instance detailsDefined in Ledger.Address |
| Pretty StakePubKeyHash Source # | |
Instance detailsDefined in Ledger.Address |
| Pretty ToCardanoError Source # | |
Instance detailsDefined in Ledger.Tx.CardanoAPI.Internal |
| Pretty FromCardanoError Source # | |
Instance detailsDefined in Ledger.Tx.CardanoAPI.Internal |
| Pretty SomeCardanoApiTx Source # | |
Instance detailsDefined in Ledger.Tx |
| Pretty CardanoBuildTx Source # | |
Instance detailsDefined in Ledger.Tx |
| Pretty Tx Source # | |
Instance detailsDefined in Ledger.Tx |
| Pretty TxOut Source # | |
Instance detailsDefined in Ledger.Tx.Internal |
| Pretty Certificate Source # | |
Instance detailsDefined in Ledger.Tx.Internal |
| Pretty Withdrawal Source # | |
Instance detailsDefined in Ledger.Tx.Internal |
| Pretty TxInput Source # | |
Instance detailsDefined in Ledger.Tx.Internal |
| Pretty TxIn Source # | |
Instance detailsDefined in Ledger.Tx.Internal |
| Pretty ValidationError Source # | |
Instance detailsDefined in Ledger.Index.Internal |
| Pretty ValidationPhase Source # | |
Instance detailsDefined in Ledger.Index.Internal |
| Pretty DecoratedTxOut Source # | |
Instance detailsDefined in Ledger.Tx |
| Pretty CardanoTx Source # | |
Instance detailsDefined in Ledger.Tx |
| Pretty OnChainTx Source # | |
Instance detailsDefined in Ledger.Blockchain |
| Pretty BlockId Source # | |
Instance detailsDefined in Ledger.Blockchain |
| Pretty a => Pretty [a] | >>> pretty [1,2,3]
[1, 2, 3]
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty a => Pretty (Maybe a) | Ignore Nothings, print Just contents. >>> pretty (Just True)
True
>>> braces (pretty (Nothing :: Maybe Bool))
{}
>>> pretty [Just 1, Nothing, Just 3, Nothing]
[1, 3]
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty a => Pretty (NonEmpty a) | |
Instance detailsDefined in Prettyprinter.Internal |
| Pretty a => Pretty (Identity a) | >>> pretty (Identity 1)
1
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty a => Pretty (LogMessage a) | |
Instance detailsDefined in Control.Monad.Freer.Extras.Log |
| (Show fun, Ord fun) => Pretty (CekExTally fun) | |
Instance detailsDefined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode |
| (Show fun, Ord fun) => Pretty (TallyingSt fun) | |
Instance detailsDefined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode |
| Show fun => Pretty (ExBudgetCategory fun) | |
Instance detailsDefined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal |
| Pretty ann => Pretty (UniqueError ann) | |
Instance detailsDefined in PlutusCore.Error |
| Pretty a => Pretty (Normalized a) | |
Instance detailsDefined in PlutusCore.Core.Type |
| PrettyClassic a => Pretty (EvaluationResult a) | |
Instance detailsDefined in PlutusCore.Evaluation.Result |
| Show a => Pretty (PrettyShow a) | |
Instance detailsDefined in Prettyprinter.Extras |
| Pretty a => Pretty (Interval a) | |
Instance detailsDefined in Plutus.V1.Ledger.Interval |
| Pretty a => Pretty (Extended a) | |
Instance detailsDefined in Plutus.V1.Ledger.Interval |
| Pretty a => Pretty (UpperBound a) | |
Instance detailsDefined in Plutus.V1.Ledger.Interval |
| Pretty a => Pretty (LowerBound a) | |
Instance detailsDefined in Plutus.V1.Ledger.Interval |
| Pretty script => Pretty (Versioned script) | |
Instance detailsDefined in Plutus.Script.Utils.Scripts |
| Show a => Pretty (PrettyShow a) Source # | |
Instance detailsDefined in Prettyprinter.Extras |
| (Pretty a1, Pretty a2) => Pretty (a1, a2) | >>> pretty (123, "hello")
(123, hello)
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty val => Pretty (Opaque val rep) | |
Instance detailsDefined in PlutusCore.Builtin.Polymorphism |
| (Pretty err, Pretty cause) => Pretty (ErrorWithCause err cause) | |
Instance detailsDefined in PlutusCore.Evaluation.Machine.Exception |
| PrettyBy config a => Pretty (AttachPrettyConfig config a) | >>> data Cfg = Cfg
>>> data D = D
>>> instance PrettyBy Cfg D where prettyBy Cfg D = "D"
>>> pretty $ AttachPrettyConfig Cfg D
D
|
Instance detailsDefined in Text.PrettyBy.Internal |
| (Foldable f, Pretty a) => Pretty (PrettyFoldable f a) | |
Instance detailsDefined in Prettyprinter.Extras |
| (Pretty k, Pretty v) => Pretty (Map k v) | |
Instance detailsDefined in PlutusTx.AssocMap |
| DefaultPrettyBy config a => Pretty (AttachDefaultPrettyConfig config a) | |
Instance detailsDefined in Text.PrettyBy.Internal |
| (Foldable f, Pretty a) => Pretty (PrettyFoldable f a) Source # | |
Instance detailsDefined in Prettyprinter.Extras |
| (Pretty a1, Pretty a2, Pretty a3) => Pretty (a1, a2, a3) | >>> pretty (123, "hello", False)
(123, hello, False)
|
Instance detailsDefined in Prettyprinter.Internal |
| Pretty a => Pretty (Const a b) | |
Instance detailsDefined in Prettyprinter.Internal |
| (KnownSymbol a, Pretty b) => Pretty (Tagged a b) Source # | |
Instance detailsDefined in Prettyprinter.Extras |
| (Pretty ann, Pretty fun, GShow uni, Closed uni, Everywhere uni PrettyConst) => Pretty (Error uni fun ann) | |
Instance detailsDefined in PlutusIR.Error |