plutus-ledger-1.1.0.0: Wallet API
Safe HaskellNone
LanguageHaskell2010

Prettyprinter.Extras

Description

Copied from plutus-ledger-api because not exported

Synopsis

Documentation

newtype PrettyShow a Source #

Newtype wrapper for deriving Pretty via a Show instance

Constructors

PrettyShow 

Fields

Instances

Instances details
Show a => Pretty (PrettyShow a) Source # 
Instance details

Defined in Prettyprinter.Extras

Methods

pretty :: PrettyShow a -> Doc ann Source #

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

class Pretty a where Source #

Overloaded conversion to Doc.

Laws:

  1. output should be pretty. :-)

Minimal complete definition

pretty

Methods

pretty :: a -> Doc ann Source #

>>> pretty 1 <+> pretty "hello" <+> pretty 1.234
1 hello 1.234

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

prettyList is only used to define the instance Pretty a => Pretty [a]. In normal circumstances only the pretty function is used.

>>> prettyList [1, 23, 456]
[1, 23, 456]

Instances

Instances details
Pretty Bool
>>> pretty True
True
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Bool -> Doc ann Source #

prettyList :: [Bool] -> Doc ann Source #

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 details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann Source #

prettyList :: [Char] -> Doc ann Source #

Pretty Double
>>> pretty (exp 1 :: Double)
2.71828182845904...
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Double -> Doc ann Source #

prettyList :: [Double] -> Doc ann Source #

Pretty Float
>>> pretty (pi :: Float)
3.1415927
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Float -> Doc ann Source #

prettyList :: [Float] -> Doc ann Source #

Pretty Int
>>> pretty (123 :: Int)
123
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int -> Doc ann Source #

prettyList :: [Int] -> Doc ann Source #

Pretty Int8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int8 -> Doc ann Source #

prettyList :: [Int8] -> Doc ann Source #

Pretty Int16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int16 -> Doc ann Source #

prettyList :: [Int16] -> Doc ann Source #

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann Source #

prettyList :: [Int32] -> Doc ann Source #

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann Source #

prettyList :: [Int64] -> Doc ann Source #

Pretty Integer
>>> pretty (2^123 :: Integer)
10633823966279326983230456482242756608
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Integer -> Doc ann Source #

prettyList :: [Integer] -> Doc ann Source #

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Natural -> Doc ann Source #

prettyList :: [Natural] -> Doc ann Source #

Pretty Word 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word -> Doc ann Source #

prettyList :: [Word] -> Doc ann Source #

Pretty Word8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word8 -> Doc ann Source #

prettyList :: [Word8] -> Doc ann Source #

Pretty Word16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word16 -> Doc ann Source #

prettyList :: [Word16] -> Doc ann Source #

Pretty Word32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word32 -> Doc ann Source #

prettyList :: [Word32] -> Doc ann Source #

Pretty Word64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word64 -> Doc ann Source #

prettyList :: [Word64] -> Doc ann Source #

Pretty ()
>>> pretty ()
()

The argument is not used:

>>> pretty (error "Strict?" :: ())
()
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: () -> Doc ann Source #

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

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 details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann Source #

prettyList :: [Text] -> Doc ann Source #

Pretty Text

(lazy Text instance, identical to the strict version)

Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann Source #

prettyList :: [Text] -> Doc ann Source #

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 details

Defined in Prettyprinter.Internal

Methods

pretty :: Void -> Doc ann Source #

prettyList :: [Void] -> Doc ann Source #

Pretty CostModelApplyError 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostModelInterface

Pretty LogLevel 
Instance details

Defined in Control.Monad.Freer.Extras.Log

Methods

pretty :: LogLevel -> Doc ann Source #

prettyList :: [LogLevel] -> Doc ann Source #

Pretty CountingSt 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Pretty RestrictingSt 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Pretty CekUserError 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Pretty DefaultFun 
Instance details

Defined in PlutusCore.Default.Builtins

Pretty ParseError 
Instance details

Defined in PlutusCore.Error

Pretty UnliftingError 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Pretty ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Methods

pretty :: ExBudget -> Doc ann Source #

prettyList :: [ExBudget] -> Doc ann Source #

Pretty ExRestrictingBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Pretty ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

pretty :: ExMemory -> Doc ann Source #

prettyList :: [ExMemory] -> Doc ann Source #

Pretty ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

pretty :: ExCPU -> Doc ann Source #

prettyList :: [ExCPU] -> Doc ann Source #

Pretty Index 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

pretty :: Index -> Doc ann Source #

prettyList :: [Index] -> Doc ann Source #

Pretty FreeVariableError 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Pretty Unique 
Instance details

Defined in PlutusCore.Name

Methods

pretty :: Unique -> Doc ann Source #

prettyList :: [Unique] -> Doc ann Source #

Pretty Data 
Instance details

Defined in PlutusCore.Data

Methods

pretty :: Data -> Doc ann Source #

prettyList :: [Data] -> Doc ann Source #

Pretty TxInInfo 
Instance details

Defined in Plutus.V2.Ledger.Contexts

Methods

pretty :: TxInInfo -> Doc ann Source #

prettyList :: [TxInInfo] -> Doc ann Source #

Pretty TxInfo 
Instance details

Defined in Plutus.V2.Ledger.Contexts

Methods

pretty :: TxInfo -> Doc ann Source #

prettyList :: [TxInfo] -> Doc ann Source #

Pretty ScriptContext 
Instance details

Defined in Plutus.V2.Ledger.Contexts

Pretty TxInInfo 
Instance details

Defined in Plutus.V1.Ledger.Contexts

Methods

pretty :: TxInInfo -> Doc ann Source #

prettyList :: [TxInInfo] -> Doc ann Source #

Pretty ScriptPurpose 
Instance details

Defined in Plutus.V1.Ledger.Contexts

Pretty TxInfo 
Instance details

Defined in Plutus.V1.Ledger.Contexts

Methods

pretty :: TxInfo -> Doc ann Source #

prettyList :: [TxInfo] -> Doc ann Source #

Pretty ScriptContext 
Instance details

Defined in Plutus.V1.Ledger.Contexts

Pretty OutputDatum 
Instance details

Defined in Plutus.V2.Ledger.Tx

Pretty TxOut 
Instance details

Defined in Plutus.V2.Ledger.Tx

Methods

pretty :: TxOut -> Doc ann Source #

prettyList :: [TxOut] -> Doc ann Source #

Pretty TxId 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

pretty :: TxId -> Doc ann Source #

prettyList :: [TxId] -> Doc ann Source #

Pretty TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

pretty :: TxOutRef -> Doc ann Source #

prettyList :: [TxOutRef] -> Doc ann Source #

Pretty TxIn 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

pretty :: TxIn -> Doc ann Source #

prettyList :: [TxIn] -> Doc ann Source #

Pretty TxOut 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

pretty :: TxOut -> Doc ann Source #

prettyList :: [TxOut] -> Doc ann Source #

Pretty Address 
Instance details

Defined in Plutus.V1.Ledger.Address

Methods

pretty :: Address -> Doc ann Source #

prettyList :: [Address] -> Doc ann Source #

Pretty DCert 
Instance details

Defined in Plutus.V1.Ledger.DCert

Methods

pretty :: DCert -> Doc ann Source #

prettyList :: [DCert] -> Doc ann Source #

Pretty StakingCredential 
Instance details

Defined in Plutus.V1.Ledger.Credential

Pretty Credential 
Instance details

Defined in Plutus.V1.Ledger.Credential

Pretty PubKeyHash 
Instance details

Defined in Plutus.V1.Ledger.Crypto

Pretty CurrencySymbol 
Instance details

Defined in Plutus.V1.Ledger.Value

Pretty TokenName 
Instance details

Defined in Plutus.V1.Ledger.Value

Methods

pretty :: TokenName -> Doc ann Source #

prettyList :: [TokenName] -> Doc ann Source #

Pretty AssetClass 
Instance details

Defined in Plutus.V1.Ledger.Value

Pretty Value 
Instance details

Defined in Plutus.V1.Ledger.Value

Methods

pretty :: Value -> Doc ann Source #

prettyList :: [Value] -> Doc ann Source #

Pretty Validator 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

pretty :: Validator -> Doc ann Source #

prettyList :: [Validator] -> Doc ann Source #

Pretty Datum 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

pretty :: Datum -> Doc ann Source #

prettyList :: [Datum] -> Doc ann Source #

Pretty Redeemer 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

pretty :: Redeemer -> Doc ann Source #

prettyList :: [Redeemer] -> Doc ann Source #

Pretty MintingPolicy 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Pretty StakeValidator 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Pretty ScriptHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Pretty ValidatorHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Pretty DatumHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

pretty :: DatumHash -> Doc ann Source #

prettyList :: [DatumHash] -> Doc ann Source #

Pretty RedeemerHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Pretty MintingPolicyHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Pretty StakeValidatorHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Pretty Context 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

pretty :: Context -> Doc ann Source #

prettyList :: [Context] -> Doc ann Source #

Pretty LedgerBytes 
Instance details

Defined in Plutus.V1.Ledger.Bytes

Pretty POSIXTime 
Instance details

Defined in Plutus.V1.Ledger.Time

Methods

pretty :: POSIXTime -> Doc ann Source #

prettyList :: [POSIXTime] -> Doc ann Source #

Pretty ProtocolVersion 
Instance details

Defined in Plutus.ApiCommon

Pretty EvaluationError 
Instance details

Defined in Plutus.ApiCommon

Pretty BuiltinData 
Instance details

Defined in PlutusTx.Builtins.Internal

Pretty BuiltinByteString 
Instance details

Defined in PlutusTx.Builtins.Internal

Pretty ConnectionError 
Instance details

Defined in Plutus.Script.Utils.V1.Typed.Scripts.Validators

Pretty LiftError 
Instance details

Defined in PlutusTx.Lift.Class

Methods

pretty :: LiftError -> Doc ann Source #

prettyList :: [LiftError] -> Doc ann Source #

Pretty CoverageReport 
Instance details

Defined in PlutusTx.Coverage

Pretty CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

Pretty Metadata 
Instance details

Defined in PlutusTx.Coverage

Methods

pretty :: Metadata -> Doc ann Source #

prettyList :: [Metadata] -> Doc ann Source #

Pretty CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

Pretty CovLoc 
Instance details

Defined in PlutusTx.Coverage

Methods

pretty :: CovLoc -> Doc ann Source #

prettyList :: [CovLoc] -> Doc ann Source #

Pretty Ada Source # 
Instance details

Defined in Ledger.Ada

Methods

pretty :: Ada -> Doc ann Source #

prettyList :: [Ada] -> Doc ann Source #

Pretty CkUserError 
Instance details

Defined in PlutusCore.Evaluation.Machine.Ck

Methods

pretty :: CkUserError -> Doc ann Source #

prettyList :: [CkUserError] -> Doc ann Source #

Pretty Slot Source # 
Instance details

Defined in Ledger.Slot

Methods

pretty :: Slot -> Doc ann Source #

prettyList :: [Slot] -> Doc ann Source #

Pretty Signature Source # 
Instance details

Defined in Ledger.Crypto

Methods

pretty :: Signature -> Doc ann Source #

prettyList :: [Signature] -> Doc ann Source #

Pretty PubKey Source # 
Instance details

Defined in Ledger.Crypto

Methods

pretty :: PubKey -> Doc ann Source #

prettyList :: [PubKey] -> Doc ann Source #

Pretty PrivateKey Source # 
Instance details

Defined in Ledger.Crypto

Pretty PaymentPubKey Source # 
Instance details

Defined in Ledger.Address

Pretty PaymentPubKeyHash Source # 
Instance details

Defined in Ledger.Address

Pretty StakePubKey Source # 
Instance details

Defined in Ledger.Address

Pretty StakePubKeyHash Source # 
Instance details

Defined in Ledger.Address

Pretty ToCardanoError Source # 
Instance details

Defined in Ledger.Tx.CardanoAPI.Internal

Pretty FromCardanoError Source # 
Instance details

Defined in Ledger.Tx.CardanoAPI.Internal

Pretty SomeCardanoApiTx Source # 
Instance details

Defined in Ledger.Tx

Pretty CardanoBuildTx Source # 
Instance details

Defined in Ledger.Tx

Pretty Tx Source # 
Instance details

Defined in Ledger.Tx

Methods

pretty :: Tx -> Doc ann Source #

prettyList :: [Tx] -> Doc ann Source #

Pretty TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

pretty :: TxOut -> Doc ann Source #

prettyList :: [TxOut] -> Doc ann Source #

Pretty Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

Pretty Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

Pretty TxInput Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

pretty :: TxInput -> Doc ann Source #

prettyList :: [TxInput] -> Doc ann Source #

Pretty TxIn Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

pretty :: TxIn -> Doc ann Source #

prettyList :: [TxIn] -> Doc ann Source #

Pretty ValidationError Source # 
Instance details

Defined in Ledger.Index.Internal

Pretty ValidationPhase Source # 
Instance details

Defined in Ledger.Index.Internal

Pretty DecoratedTxOut Source # 
Instance details

Defined in Ledger.Tx

Pretty CardanoTx Source # 
Instance details

Defined in Ledger.Tx

Methods

pretty :: CardanoTx -> Doc ann Source #

prettyList :: [CardanoTx] -> Doc ann Source #

Pretty OnChainTx Source # 
Instance details

Defined in Ledger.Blockchain

Methods

pretty :: OnChainTx -> Doc ann Source #

prettyList :: [OnChainTx] -> Doc ann Source #

Pretty BlockId Source # 
Instance details

Defined in Ledger.Blockchain

Methods

pretty :: BlockId -> Doc ann Source #

prettyList :: [BlockId] -> Doc ann Source #

Pretty a => Pretty [a]
>>> pretty [1,2,3]
[1, 2, 3]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: [a] -> Doc ann Source #

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

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 details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann Source #

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

Pretty a => Pretty (NonEmpty a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: NonEmpty a -> Doc ann Source #

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

Pretty a => Pretty (Identity a)
>>> pretty (Identity 1)
1
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Identity a -> Doc ann Source #

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

Pretty a => Pretty (LogMessage a) 
Instance details

Defined in Control.Monad.Freer.Extras.Log

Methods

pretty :: LogMessage a -> Doc ann Source #

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

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

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

pretty :: CekExTally fun -> Doc ann Source #

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

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

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Methods

pretty :: TallyingSt fun -> Doc ann Source #

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

Show fun => Pretty (ExBudgetCategory fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Pretty ann => Pretty (UniqueError ann) 
Instance details

Defined in PlutusCore.Error

Methods

pretty :: UniqueError ann -> Doc ann0 Source #

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

Pretty a => Pretty (Normalized a) 
Instance details

Defined in PlutusCore.Core.Type

Methods

pretty :: Normalized a -> Doc ann Source #

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

PrettyClassic a => Pretty (EvaluationResult a) 
Instance details

Defined in PlutusCore.Evaluation.Result

Show a => Pretty (PrettyShow a) 
Instance details

Defined in Prettyprinter.Extras

Methods

pretty :: PrettyShow a -> Doc ann Source #

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

Pretty a => Pretty (Interval a) 
Instance details

Defined in Plutus.V1.Ledger.Interval

Methods

pretty :: Interval a -> Doc ann Source #

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

Pretty a => Pretty (Extended a) 
Instance details

Defined in Plutus.V1.Ledger.Interval

Methods

pretty :: Extended a -> Doc ann Source #

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

Pretty a => Pretty (UpperBound a) 
Instance details

Defined in Plutus.V1.Ledger.Interval

Methods

pretty :: UpperBound a -> Doc ann Source #

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

Pretty a => Pretty (LowerBound a) 
Instance details

Defined in Plutus.V1.Ledger.Interval

Methods

pretty :: LowerBound a -> Doc ann Source #

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

Pretty script => Pretty (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

pretty :: Versioned script -> Doc ann Source #

prettyList :: [Versioned script] -> Doc ann Source #

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

Defined in Prettyprinter.Extras

Methods

pretty :: PrettyShow a -> Doc ann Source #

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

(Pretty a1, Pretty a2) => Pretty (a1, a2)
>>> pretty (123, "hello")
(123, hello)
Instance details

Defined in Prettyprinter.Internal

Methods

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

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

Pretty val => Pretty (Opaque val rep) 
Instance details

Defined in PlutusCore.Builtin.Polymorphism

Methods

pretty :: Opaque val rep -> Doc ann Source #

prettyList :: [Opaque val rep] -> Doc ann Source #

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

Defined in PlutusCore.Evaluation.Machine.Exception

Methods

pretty :: ErrorWithCause err cause -> Doc ann Source #

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

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 details

Defined in Text.PrettyBy.Internal

Methods

pretty :: AttachPrettyConfig config a -> Doc ann Source #

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

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

Defined in Prettyprinter.Extras

Methods

pretty :: PrettyFoldable f a -> Doc ann Source #

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

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

Defined in PlutusTx.AssocMap

Methods

pretty :: Map k v -> Doc ann Source #

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

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

Defined in Text.PrettyBy.Internal

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

Defined in Prettyprinter.Extras

Methods

pretty :: PrettyFoldable f a -> Doc ann Source #

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

(Pretty a1, Pretty a2, Pretty a3) => Pretty (a1, a2, a3)
>>> pretty (123, "hello", False)
(123, hello, False)
Instance details

Defined in Prettyprinter.Internal

Methods

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

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

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

Defined in Prettyprinter.Internal

Methods

pretty :: Const a b -> Doc ann Source #

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

(KnownSymbol a, Pretty b) => Pretty (Tagged a b) Source # 
Instance details

Defined in Prettyprinter.Extras

Methods

pretty :: Tagged a b -> Doc ann Source #

prettyList :: [Tagged a b] -> Doc ann Source #

(Pretty ann, Pretty fun, GShow uni, Closed uni, Everywhere uni PrettyConst) => Pretty (Error uni fun ann) 
Instance details

Defined in PlutusIR.Error

Methods

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

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

newtype PrettyFoldable f a Source #

Newtype wrapper for deriving Pretty for a Foldable container by calling toList.

Constructors

PrettyFoldable 

Fields

Instances

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

Defined in Prettyprinter.Extras

Methods

pretty :: PrettyFoldable f a -> Doc ann Source #

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

newtype Tagged (s :: k) b Source #

A Tagged s b value is a value b with an attached phantom type s. This can be used in place of the more traditional but less safe idiom of passing in an undefined value with the type, because unlike an (s -> b), a Tagged s b can't try to use the argument s as a real value.

Moreover, you don't have to rely on the compiler to inline away the extra argument, because the newtype is "free"

Tagged has kind k -> * -> * if the compiler supports PolyKinds, therefore there is an extra k showing in the instance haddocks that may cause confusion.

Constructors

Tagged b 

Instances

Instances details
FunctorWithIndex () (Tagged a) 
Instance details

Defined in Control.Lens.Indexed

Methods

imap :: (() -> a0 -> b) -> Tagged a a0 -> Tagged a b Source #

imapped :: IndexedSetter () (Tagged a a0) (Tagged a b) a0 b Source #

FoldableWithIndex () (Tagged a) 
Instance details

Defined in Control.Lens.Indexed

Methods

ifoldMap :: Monoid m => (() -> a0 -> m) -> Tagged a a0 -> m Source #

ifolded :: IndexedFold () (Tagged a a0) a0 Source #

ifoldr :: (() -> a0 -> b -> b) -> b -> Tagged a a0 -> b Source #

ifoldl :: (() -> b -> a0 -> b) -> b -> Tagged a a0 -> b Source #

ifoldr' :: (() -> a0 -> b -> b) -> b -> Tagged a a0 -> b Source #

ifoldl' :: (() -> b -> a0 -> b) -> b -> Tagged a a0 -> b Source #

TraversableWithIndex () (Tagged a) 
Instance details

Defined in Control.Lens.Indexed

Methods

itraverse :: Applicative f => (() -> a0 -> f b) -> Tagged a a0 -> f (Tagged a b) Source #

itraversed :: IndexedTraversal () (Tagged a a0) (Tagged a b) a0 b Source #

ToJSON2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> Tagged a b -> Value Source #

liftToJSONList2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> [Tagged a b] -> Value Source #

liftToEncoding2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> Tagged a b -> Encoding Source #

liftToEncodingList2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> [Tagged a b] -> Encoding Source #

FromJSON2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Tagged a b) Source #

liftParseJSONList2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Tagged a b] Source #

Bifunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bimap :: (a -> b) -> (c -> d) -> Tagged a c -> Tagged b d Source #

first :: (a -> b) -> Tagged a c -> Tagged b c Source #

second :: (b -> c) -> Tagged a b -> Tagged a c Source #

Bitraversable (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Tagged a b -> f (Tagged c d) Source #

Bifoldable (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bifold :: Monoid m => Tagged m m -> m Source #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Tagged a b -> m Source #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Tagged a b -> c Source #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Tagged a b -> c Source #

Eq2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Tagged a c -> Tagged b d -> Bool Source #

Ord2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Tagged a c -> Tagged b d -> Ordering Source #

Read2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Tagged a b) Source #

liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Tagged a b] Source #

liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Tagged a b) Source #

liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Tagged a b] Source #

Show2 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Tagged a b -> ShowS Source #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Tagged a b] -> ShowS Source #

Biapplicative (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Biapplicative

Methods

bipure :: a -> b -> Tagged a b Source #

(<<*>>) :: Tagged (a -> b) (c -> d) -> Tagged a c -> Tagged b d Source #

biliftA2 :: (a -> b -> c) -> (d -> e -> f) -> Tagged a d -> Tagged b e -> Tagged c f Source #

(*>>) :: Tagged a b -> Tagged c d -> Tagged c d Source #

(<<*) :: Tagged a b -> Tagged c d -> Tagged a b Source #

Profunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Unsafe

Methods

dimap :: (a -> b) -> (c -> d) -> Tagged b c -> Tagged a d Source #

lmap :: (a -> b) -> Tagged b c -> Tagged a c Source #

rmap :: (b -> c) -> Tagged a b -> Tagged a c Source #

(#.) :: forall a b c q. Coercible c b => q b c -> Tagged a b -> Tagged a c Source #

(.#) :: forall a b c q. Coercible b a => Tagged b c -> q a b -> Tagged a c Source #

Bitraversable1 (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

bitraverse1 :: Apply f => (a -> f b) -> (c -> f d) -> Tagged a c -> f (Tagged b d) Source #

bisequence1 :: Apply f => Tagged (f a) (f b) -> f (Tagged a b) Source #

Costrong (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Strong

Methods

unfirst :: Tagged (a, d) (b, d) -> Tagged a b Source #

unsecond :: Tagged (d, a) (d, b) -> Tagged a b Source #

Corepresentable (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Rep

Associated Types

type Corep Tagged :: Type -> Type Source #

Methods

cotabulate :: (Corep Tagged d -> c) -> Tagged d c Source #

Choice (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Choice

Methods

left' :: Tagged a b -> Tagged (Either a c) (Either b c) Source #

right' :: Tagged a b -> Tagged (Either c a) (Either c b) Source #

Generic1 (Tagged s :: Type -> Type) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep1 (Tagged s) :: k -> Type Source #

Methods

from1 :: forall (a :: k). Tagged s a -> Rep1 (Tagged s) a Source #

to1 :: forall (a :: k). Rep1 (Tagged s) a -> Tagged s a Source #

Monad (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

(>>=) :: Tagged s a -> (a -> Tagged s b) -> Tagged s b Source #

(>>) :: Tagged s a -> Tagged s b -> Tagged s b Source #

return :: a -> Tagged s a Source #

Functor (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fmap :: (a -> b) -> Tagged s a -> Tagged s b Source #

(<$) :: a -> Tagged s b -> Tagged s a Source #

Applicative (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

pure :: a -> Tagged s a Source #

(<*>) :: Tagged s (a -> b) -> Tagged s a -> Tagged s b Source #

liftA2 :: (a -> b -> c) -> Tagged s a -> Tagged s b -> Tagged s c Source #

(*>) :: Tagged s a -> Tagged s b -> Tagged s b Source #

(<*) :: Tagged s a -> Tagged s b -> Tagged s a Source #

Foldable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fold :: Monoid m => Tagged s m -> m Source #

foldMap :: Monoid m => (a -> m) -> Tagged s a -> m Source #

foldMap' :: Monoid m => (a -> m) -> Tagged s a -> m Source #

foldr :: (a -> b -> b) -> b -> Tagged s a -> b Source #

foldr' :: (a -> b -> b) -> b -> Tagged s a -> b Source #

foldl :: (b -> a -> b) -> b -> Tagged s a -> b Source #

foldl' :: (b -> a -> b) -> b -> Tagged s a -> b Source #

foldr1 :: (a -> a -> a) -> Tagged s a -> a Source #

foldl1 :: (a -> a -> a) -> Tagged s a -> a Source #

toList :: Tagged s a -> [a] Source #

null :: Tagged s a -> Bool Source #

length :: Tagged s a -> Int Source #

elem :: Eq a => a -> Tagged s a -> Bool Source #

maximum :: Ord a => Tagged s a -> a Source #

minimum :: Ord a => Tagged s a -> a Source #

sum :: Num a => Tagged s a -> a Source #

product :: Num a => Tagged s a -> a Source #

Traversable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

traverse :: Applicative f => (a -> f b) -> Tagged s a -> f (Tagged s b) Source #

sequenceA :: Applicative f => Tagged s (f a) -> f (Tagged s a) Source #

mapM :: Monad m => (a -> m b) -> Tagged s a -> m (Tagged s b) Source #

sequence :: Monad m => Tagged s (m a) -> m (Tagged s a) Source #

Representable (Tagged t) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (Tagged t) Source #

Methods

tabulate :: (Rep (Tagged t) -> a) -> Tagged t a Source #

index :: Tagged t a -> Rep (Tagged t) -> a Source #

ToJSON1 (Tagged a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a0 -> Value) -> ([a0] -> Value) -> Tagged a a0 -> Value Source #

liftToJSONList :: (a0 -> Value) -> ([a0] -> Value) -> [Tagged a a0] -> Value Source #

liftToEncoding :: (a0 -> Encoding) -> ([a0] -> Encoding) -> Tagged a a0 -> Encoding Source #

liftToEncodingList :: (a0 -> Encoding) -> ([a0] -> Encoding) -> [Tagged a a0] -> Encoding Source #

FromJSON1 (Tagged a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Tagged a a0) Source #

liftParseJSONList :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Tagged a a0] Source #

Eq1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftEq :: (a -> b -> Bool) -> Tagged s a -> Tagged s b -> Bool Source #

Ord1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftCompare :: (a -> b -> Ordering) -> Tagged s a -> Tagged s b -> Ordering Source #

Show1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Tagged s a -> ShowS Source #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Tagged s a] -> ShowS Source #

Read1 (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Tagged s a) Source #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Tagged s a] Source #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Tagged s a) Source #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Tagged s a] Source #

Comonad (Tagged s) 
Instance details

Defined in Control.Comonad

Methods

extract :: Tagged s a -> a Source #

duplicate :: Tagged s a -> Tagged s (Tagged s a) Source #

extend :: (Tagged s a -> b) -> Tagged s a -> Tagged s b Source #

Traversable1 (Tagged a) 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a0 -> f b) -> Tagged a a0 -> f (Tagged a b) Source #

sequence1 :: Apply f => Tagged a (f b) -> f (Tagged a b) Source #

Bounded b => Bounded (Tagged s b) 
Instance details

Defined in Data.Tagged

Enum a => Enum (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

succ :: Tagged s a -> Tagged s a Source #

pred :: Tagged s a -> Tagged s a Source #

toEnum :: Int -> Tagged s a Source #

fromEnum :: Tagged s a -> Int Source #

enumFrom :: Tagged s a -> [Tagged s a] Source #

enumFromThen :: Tagged s a -> Tagged s a -> [Tagged s a] Source #

enumFromTo :: Tagged s a -> Tagged s a -> [Tagged s a] Source #

enumFromThenTo :: Tagged s a -> Tagged s a -> Tagged s a -> [Tagged s a] Source #

Eq b => Eq (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

(==) :: Tagged s b -> Tagged s b -> Bool Source #

(/=) :: Tagged s b -> Tagged s b -> Bool Source #

Floating a => Floating (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

pi :: Tagged s a Source #

exp :: Tagged s a -> Tagged s a Source #

log :: Tagged s a -> Tagged s a Source #

sqrt :: Tagged s a -> Tagged s a Source #

(**) :: Tagged s a -> Tagged s a -> Tagged s a Source #

logBase :: Tagged s a -> Tagged s a -> Tagged s a Source #

sin :: Tagged s a -> Tagged s a Source #

cos :: Tagged s a -> Tagged s a Source #

tan :: Tagged s a -> Tagged s a Source #

asin :: Tagged s a -> Tagged s a Source #

acos :: Tagged s a -> Tagged s a Source #

atan :: Tagged s a -> Tagged s a Source #

sinh :: Tagged s a -> Tagged s a Source #

cosh :: Tagged s a -> Tagged s a Source #

tanh :: Tagged s a -> Tagged s a Source #

asinh :: Tagged s a -> Tagged s a Source #

acosh :: Tagged s a -> Tagged s a Source #

atanh :: Tagged s a -> Tagged s a Source #

log1p :: Tagged s a -> Tagged s a Source #

expm1 :: Tagged s a -> Tagged s a Source #

log1pexp :: Tagged s a -> Tagged s a Source #

log1mexp :: Tagged s a -> Tagged s a Source #

Fractional a => Fractional (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(/) :: Tagged s a -> Tagged s a -> Tagged s a Source #

recip :: Tagged s a -> Tagged s a Source #

fromRational :: Rational -> Tagged s a Source #

Integral a => Integral (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

quot :: Tagged s a -> Tagged s a -> Tagged s a Source #

rem :: Tagged s a -> Tagged s a -> Tagged s a Source #

div :: Tagged s a -> Tagged s a -> Tagged s a Source #

mod :: Tagged s a -> Tagged s a -> Tagged s a Source #

quotRem :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) Source #

divMod :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) Source #

toInteger :: Tagged s a -> Integer Source #

(Data s, Data b) => Data (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Tagged s b -> c (Tagged s b) Source #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Tagged s b) Source #

toConstr :: Tagged s b -> Constr Source #

dataTypeOf :: Tagged s b -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Tagged s b)) Source #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Tagged s b)) Source #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Tagged s b -> Tagged s b Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tagged s b -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tagged s b -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> Tagged s b -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tagged s b -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) Source #

Num a => Num (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(+) :: Tagged s a -> Tagged s a -> Tagged s a Source #

(-) :: Tagged s a -> Tagged s a -> Tagged s a Source #

(*) :: Tagged s a -> Tagged s a -> Tagged s a Source #

negate :: Tagged s a -> Tagged s a Source #

abs :: Tagged s a -> Tagged s a Source #

signum :: Tagged s a -> Tagged s a Source #

fromInteger :: Integer -> Tagged s a Source #

Ord b => Ord (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

compare :: Tagged s b -> Tagged s b -> Ordering Source #

(<) :: Tagged s b -> Tagged s b -> Bool Source #

(<=) :: Tagged s b -> Tagged s b -> Bool Source #

(>) :: Tagged s b -> Tagged s b -> Bool Source #

(>=) :: Tagged s b -> Tagged s b -> Bool Source #

max :: Tagged s b -> Tagged s b -> Tagged s b Source #

min :: Tagged s b -> Tagged s b -> Tagged s b Source #

Read b => Read (Tagged s b) 
Instance details

Defined in Data.Tagged

Real a => Real (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

toRational :: Tagged s a -> Rational Source #

RealFloat a => RealFloat (Tagged s a) 
Instance details

Defined in Data.Tagged

RealFrac a => RealFrac (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

properFraction :: Integral b => Tagged s a -> (b, Tagged s a) Source #

truncate :: Integral b => Tagged s a -> b Source #

round :: Integral b => Tagged s a -> b Source #

ceiling :: Integral b => Tagged s a -> b Source #

floor :: Integral b => Tagged s a -> b Source #

Show b => Show (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

showsPrec :: Int -> Tagged s b -> ShowS Source #

show :: Tagged s b -> String Source #

showList :: [Tagged s b] -> ShowS Source #

Ix b => Ix (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

range :: (Tagged s b, Tagged s b) -> [Tagged s b] Source #

index :: (Tagged s b, Tagged s b) -> Tagged s b -> Int Source #

unsafeIndex :: (Tagged s b, Tagged s b) -> Tagged s b -> Int Source #

inRange :: (Tagged s b, Tagged s b) -> Tagged s b -> Bool Source #

rangeSize :: (Tagged s b, Tagged s b) -> Int Source #

unsafeRangeSize :: (Tagged s b, Tagged s b) -> Int Source #

IsString a => IsString (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

fromString :: String -> Tagged s a Source #

Generic (Tagged s b) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep (Tagged s b) :: Type -> Type Source #

Methods

from :: Tagged s b -> Rep (Tagged s b) x Source #

to :: Rep (Tagged s b) x -> Tagged s b Source #

Semigroup a => Semigroup (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(<>) :: Tagged s a -> Tagged s a -> Tagged s a Source #

sconcat :: NonEmpty (Tagged s a) -> Tagged s a Source #

stimes :: Integral b => b -> Tagged s a -> Tagged s a Source #

(Semigroup a, Monoid a) => Monoid (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

mempty :: Tagged s a Source #

mappend :: Tagged s a -> Tagged s a -> Tagged s a Source #

mconcat :: [Tagged s a] -> Tagged s a Source #

NFData b => NFData (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

rnf :: Tagged s b -> () Source #

ToJSON b => ToJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey b => ToJSONKey (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

FromJSON b => FromJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey b => FromJSONKey (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Storable a => Storable (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

sizeOf :: Tagged s a -> Int Source #

alignment :: Tagged s a -> Int Source #

peekElemOff :: Ptr (Tagged s a) -> Int -> IO (Tagged s a) Source #

pokeElemOff :: Ptr (Tagged s a) -> Int -> Tagged s a -> IO () Source #

peekByteOff :: Ptr b -> Int -> IO (Tagged s a) Source #

pokeByteOff :: Ptr b -> Int -> Tagged s a -> IO () Source #

peek :: Ptr (Tagged s a) -> IO (Tagged s a) Source #

poke :: Ptr (Tagged s a) -> Tagged s a -> IO () Source #

Bits a => Bits (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(.&.) :: Tagged s a -> Tagged s a -> Tagged s a Source #

(.|.) :: Tagged s a -> Tagged s a -> Tagged s a Source #

xor :: Tagged s a -> Tagged s a -> Tagged s a Source #

complement :: Tagged s a -> Tagged s a Source #

shift :: Tagged s a -> Int -> Tagged s a Source #

rotate :: Tagged s a -> Int -> Tagged s a Source #

zeroBits :: Tagged s a Source #

bit :: Int -> Tagged s a Source #

setBit :: Tagged s a -> Int -> Tagged s a Source #

clearBit :: Tagged s a -> Int -> Tagged s a Source #

complementBit :: Tagged s a -> Int -> Tagged s a Source #

testBit :: Tagged s a -> Int -> Bool Source #

bitSizeMaybe :: Tagged s a -> Maybe Int Source #

bitSize :: Tagged s a -> Int Source #

isSigned :: Tagged s a -> Bool Source #

shiftL :: Tagged s a -> Int -> Tagged s a Source #

unsafeShiftL :: Tagged s a -> Int -> Tagged s a Source #

shiftR :: Tagged s a -> Int -> Tagged s a Source #

unsafeShiftR :: Tagged s a -> Int -> Tagged s a Source #

rotateL :: Tagged s a -> Int -> Tagged s a Source #

rotateR :: Tagged s a -> Int -> Tagged s a Source #

popCount :: Tagged s a -> Int Source #

FiniteBits a => FiniteBits (Tagged s a) 
Instance details

Defined in Data.Tagged

(Typeable s, FromCBOR a) => FromCBOR (Tagged s a) 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

fromCBOR :: Decoder s0 (Tagged s a) Source #

label :: Proxy (Tagged s a) -> Text Source #

(Typeable s, ToCBOR a) => ToCBOR (Tagged s a) 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBOR :: Tagged s a -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (Tagged s a) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Tagged s a] -> Size Source #

ToFormKey a => ToFormKey (Tagged b a) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Tagged b a -> Text Source #

FromFormKey a => FromFormKey (Tagged b a) 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToHttpApiData a => ToHttpApiData (Tagged b a)

Note: this instance is not polykinded

Instance details

Defined in Web.Internal.HttpApiData

FromHttpApiData a => FromHttpApiData (Tagged b a)

Note: this instance is not polykinded

Instance details

Defined in Web.Internal.HttpApiData

Wrapped (Tagged s a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Tagged s a) Source #

Methods

_Wrapped' :: Iso' (Tagged s a) (Unwrapped (Tagged s a)) Source #

(KnownSymbol a, Pretty b) => Pretty (Tagged a b) Source # 
Instance details

Defined in Prettyprinter.Extras

Methods

pretty :: Tagged a b -> Doc ann Source #

prettyList :: [Tagged a b] -> Doc ann Source #

t ~ Tagged s' a' => Rewrapped (Tagged s a) t 
Instance details

Defined in Control.Lens.Wrapped

type Corep (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Profunctor.Rep

type Corep (Tagged :: Type -> Type -> Type) = Proxy :: Type -> Type
type Rep1 (Tagged s :: Type -> Type) 
Instance details

Defined in Data.Tagged

type Rep1 (Tagged s :: Type -> Type) = D1 ('MetaData "Tagged" "Data.Tagged" "tagged-0.8.6.1-FrcGz07UL8JLBH1HDgRCLg" 'True) (C1 ('MetaCons "Tagged" 'PrefixI 'True) (S1 ('MetaSel ('Just "unTagged") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type Rep (Tagged t) 
Instance details

Defined in Data.Functor.Rep

type Rep (Tagged t) = ()
type Rep (Tagged s b) 
Instance details

Defined in Data.Tagged

type Rep (Tagged s b) = D1 ('MetaData "Tagged" "Data.Tagged" "tagged-0.8.6.1-FrcGz07UL8JLBH1HDgRCLg" 'True) (C1 ('MetaCons "Tagged" 'PrefixI 'True) (S1 ('MetaSel ('Just "unTagged") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))
type Unwrapped (Tagged s a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Tagged s a) = a

Orphan instances

(KnownSymbol a, Pretty b) => Pretty (Tagged a b) Source # 
Instance details

Methods

pretty :: Tagged a b -> Doc ann Source #

prettyList :: [Tagged a b] -> Doc ann Source #