plutus-ledger-1.2.0.0: Wallet API
Safe HaskellNone
LanguageHaskell2010

Ledger.Tx.Internal

Synopsis

Documentation

type ReferenceScript = ReferenceScript BabbageEra Source #

newtype TxOut Source #

Constructors

TxOut 

Fields

Instances

Instances details
Eq TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

(==) :: TxOut -> TxOut -> Bool Source #

(/=) :: TxOut -> TxOut -> Bool Source #

Show TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Generic TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Associated Types

type Rep TxOut :: Type -> Type Source #

Methods

from :: TxOut -> Rep TxOut x Source #

to :: Rep TxOut x -> TxOut Source #

Serialise TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

encode :: TxOut -> Encoding

decode :: Decoder s TxOut

encodeList :: [TxOut] -> Encoding

decodeList :: Decoder s [TxOut]

FromJSON TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

parseJSON :: Value -> Parser TxOut

parseJSONList :: Value -> Parser [TxOut]

ToJSON TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

toJSON :: TxOut -> Value

toEncoding :: TxOut -> Encoding

toJSONList :: [TxOut] -> Value

toEncodingList :: [TxOut] -> Encoding

Pretty TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

pretty :: TxOut -> Doc ann #

prettyList :: [TxOut] -> Doc ann #

FromCBOR TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

fromCBOR :: Decoder s TxOut

label :: Proxy TxOut -> Text

ToCBOR TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

toCBOR :: TxOut -> Encoding

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy TxOut -> Size

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [TxOut] -> Size

type Rep TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

type Rep TxOut = D1 ('MetaData "TxOut" "Ledger.Tx.Internal" "plutus-ledger-1.2.0.0-8dOSOspdVv7Hd909lHBnfn" 'True) (C1 ('MetaCons "TxOut" 'PrefixI 'True) (S1 ('MetaSel ('Just "getTxOut") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TxOut CtxTx BabbageEra))))

data Certificate Source #

Constructors

Certificate 

Fields

Instances

Instances details
Eq Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

Show Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

Generic Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

Associated Types

type Rep Certificate :: Type -> Type Source #

Serialise Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

encode :: Certificate -> Encoding

decode :: Decoder s Certificate

encodeList :: [Certificate] -> Encoding

decodeList :: Decoder s [Certificate]

FromJSON Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

parseJSON :: Value -> Parser Certificate

parseJSONList :: Value -> Parser [Certificate]

ToJSON Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

toJSON :: Certificate -> Value

toEncoding :: Certificate -> Encoding

toJSONList :: [Certificate] -> Value

toEncodingList :: [Certificate] -> Encoding

Pretty Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

pretty :: Certificate -> Doc ann #

prettyList :: [Certificate] -> Doc ann #

type Rep Certificate Source # 
Instance details

Defined in Ledger.Tx.Internal

type Rep Certificate = D1 ('MetaData "Certificate" "Ledger.Tx.Internal" "plutus-ledger-1.2.0.0-8dOSOspdVv7Hd909lHBnfn" 'False) (C1 ('MetaCons "Certificate" 'PrefixI 'True) (S1 ('MetaSel ('Just "certificateDcert") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DCert) :*: S1 ('MetaSel ('Just "certificateRedeemer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Redeemer))))

data Withdrawal Source #

Stake withdrawal, if applicable the script should be included in txScripts.

Constructors

Withdrawal 

Fields

Instances

Instances details
Eq Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

Show Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

Generic Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

Associated Types

type Rep Withdrawal :: Type -> Type Source #

Serialise Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

encode :: Withdrawal -> Encoding

decode :: Decoder s Withdrawal

encodeList :: [Withdrawal] -> Encoding

decodeList :: Decoder s [Withdrawal]

FromJSON Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

parseJSON :: Value -> Parser Withdrawal

parseJSONList :: Value -> Parser [Withdrawal]

ToJSON Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

toJSON :: Withdrawal -> Value

toEncoding :: Withdrawal -> Encoding

toJSONList :: [Withdrawal] -> Value

toEncodingList :: [Withdrawal] -> Encoding

Pretty Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

pretty :: Withdrawal -> Doc ann #

prettyList :: [Withdrawal] -> Doc ann #

type Rep Withdrawal Source # 
Instance details

Defined in Ledger.Tx.Internal

type Rep Withdrawal = D1 ('MetaData "Withdrawal" "Ledger.Tx.Internal" "plutus-ledger-1.2.0.0-8dOSOspdVv7Hd909lHBnfn" 'False) (C1 ('MetaCons "Withdrawal" 'PrefixI 'True) (S1 ('MetaSel ('Just "withdrawalCredential") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Credential) :*: (S1 ('MetaSel ('Just "withdrawalAmount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "withdrawalRedeemer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Redeemer)))))

cardanoTxOutValue :: TxOut ctx era -> Value Source #

outValue :: Lens TxOut TxOut Value (TxOutValue BabbageEra) Source #

outValue' :: Lens' TxOut (TxOutValue BabbageEra) Source #

toSizedTxOut :: TxOut -> Sized (TxOut StandardBabbage) Source #

toCtxUTxOTxOut :: TxOut -> TxOut CtxUTxO BabbageEra Source #

txOutDatumHash :: TxOut -> Maybe DatumHash Source #

Get a hash from the stored TxOutDatum (either directly or by hashing the inlined datum)

txOutDatum :: forall d. FromData d => TxOut -> Maybe d Source #

cardanoTxOutDatumHash :: TxOutDatum CtxUTxO BabbageEra -> Maybe (Hash ScriptData) Source #

outAddress :: Lens' TxOut (AddressInEra BabbageEra) Source #

outDatumHash :: Lens TxOut TxOut (Maybe DatumHash) (TxOutDatum CtxTx BabbageEra) Source #

emptyTxBodyContent :: TxBodyContent BuildTx BabbageEra Source #

data Language #

Constructors

PlutusV1 
PlutusV2 

Instances

Instances details
Bounded Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Enum Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Eq Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Ord Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Show Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Ix Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Generic Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Associated Types

type Rep Language :: Type -> Type Source #

NFData Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Methods

rnf :: Language -> () Source #

NoThunks Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Methods

noThunks :: Context -> Language -> IO (Maybe ThunkInfo)

wNoThunks :: Context -> Language -> IO (Maybe ThunkInfo)

showTypeOf :: Proxy Language -> String

FromCBOR Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Methods

fromCBOR :: Decoder s Language

label :: Proxy Language -> Text

ToCBOR Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Methods

toCBOR :: Language -> Encoding

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Language -> Size

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Language] -> Size

type Rep Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

type Rep Language = D1 ('MetaData "Language" "Cardano.Ledger.Alonzo.Language" "cardano-ledger-alonzo-0.1.0.0-9kQ50A9XcYDHq5wCBkTOc6" 'False) (C1 ('MetaCons "PlutusV1" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PlutusV2" 'PrefixI 'False) (U1 :: Type -> Type))

newtype TxOut Source #

Constructors

TxOut 

Fields

Instances

Instances details
Eq TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

(==) :: TxOut -> TxOut -> Bool Source #

(/=) :: TxOut -> TxOut -> Bool Source #

Show TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Generic TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Associated Types

type Rep TxOut :: Type -> Type Source #

Methods

from :: TxOut -> Rep TxOut x Source #

to :: Rep TxOut x -> TxOut Source #

Serialise TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

encode :: TxOut -> Encoding

decode :: Decoder s TxOut

encodeList :: [TxOut] -> Encoding

decodeList :: Decoder s [TxOut]

FromJSON TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

parseJSON :: Value -> Parser TxOut

parseJSONList :: Value -> Parser [TxOut]

ToJSON TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

toJSON :: TxOut -> Value

toEncoding :: TxOut -> Encoding

toJSONList :: [TxOut] -> Value

toEncodingList :: [TxOut] -> Encoding

Pretty TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

pretty :: TxOut -> Doc ann #

prettyList :: [TxOut] -> Doc ann #

FromCBOR TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

fromCBOR :: Decoder s TxOut

label :: Proxy TxOut -> Text

ToCBOR TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

Methods

toCBOR :: TxOut -> Encoding

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy TxOut -> Size

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [TxOut] -> Size

type Rep TxOut Source # 
Instance details

Defined in Ledger.Tx.Internal

type Rep TxOut = D1 ('MetaData "TxOut" "Ledger.Tx.Internal" "plutus-ledger-1.2.0.0-8dOSOspdVv7Hd909lHBnfn" 'True) (C1 ('MetaCons "TxOut" 'PrefixI 'True) (S1 ('MetaSel ('Just "getTxOut") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TxOut CtxTx BabbageEra))))

data TxOutRef #

Constructors

TxOutRef 

Fields

Instances

Instances details
Eq TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Ord TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Show TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Generic TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Associated Types

type Rep TxOutRef :: Type -> Type Source #

NFData TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

rnf :: TxOutRef -> () Source #

Serialise TxOutRef 
Instance details

Defined in Ledger.Tx.Orphans.V1

Methods

encode :: TxOutRef -> Encoding

decode :: Decoder s TxOutRef

encodeList :: [TxOutRef] -> Encoding

decodeList :: Decoder s [TxOutRef]

FromJSON TxOutRef 
Instance details

Defined in Ledger.Tx.Orphans.V1

Methods

parseJSON :: Value -> Parser TxOutRef

parseJSONList :: Value -> Parser [TxOutRef]

FromJSONKey TxOutRef 
Instance details

Defined in Ledger.Tx.Orphans.V1

Methods

fromJSONKey :: FromJSONKeyFunction TxOutRef

fromJSONKeyList :: FromJSONKeyFunction [TxOutRef]

ToJSON TxOutRef 
Instance details

Defined in Ledger.Tx.Orphans.V1

Methods

toJSON :: TxOutRef -> Value

toEncoding :: TxOutRef -> Encoding

toJSONList :: [TxOutRef] -> Value

toEncodingList :: [TxOutRef] -> Encoding

ToJSONKey TxOutRef 
Instance details

Defined in Ledger.Tx.Orphans.V1

Methods

toJSONKey :: ToJSONKeyFunction TxOutRef

toJSONKeyList :: ToJSONKeyFunction [TxOutRef]

Eq TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

(==) :: TxOutRef -> TxOutRef -> Bool

Pretty TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

pretty :: TxOutRef -> Doc ann #

prettyList :: [TxOutRef] -> Doc ann #

FromData TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

fromBuiltinData :: BuiltinData -> Maybe TxOutRef

ToData TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

toBuiltinData :: TxOutRef -> BuiltinData

UnsafeFromData TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

unsafeFromBuiltinData :: BuiltinData -> TxOutRef

Lift DefaultUni TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

lift :: TxOutRef -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ())

Typeable DefaultUni TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

typeRep :: Proxy TxOutRef -> RTCompile DefaultUni fun (Type TyName DefaultUni ())

type Rep TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

type Rep TxOutRef = D1 ('MetaData "TxOutRef" "Plutus.V1.Ledger.Tx" "plutus-ledger-api-1.0.0.1-6EvbyJiK8IAAVEtnIJDu5Z" 'False) (C1 ('MetaCons "TxOutRef" 'PrefixI 'True) (S1 ('MetaSel ('Just "txOutRefId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TxId) :*: S1 ('MetaSel ('Just "txOutRefIdx") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))

data Versioned script #

Constructors

Versioned 

Fields

Instances

Instances details
Functor Versioned 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

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

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

Eq script => Eq (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

(==) :: Versioned script -> Versioned script -> Bool Source #

(/=) :: Versioned script -> Versioned script -> Bool Source #

Ord script => Ord (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

compare :: Versioned script -> Versioned script -> Ordering Source #

(<) :: Versioned script -> Versioned script -> Bool Source #

(<=) :: Versioned script -> Versioned script -> Bool Source #

(>) :: Versioned script -> Versioned script -> Bool Source #

(>=) :: Versioned script -> Versioned script -> Bool Source #

max :: Versioned script -> Versioned script -> Versioned script Source #

min :: Versioned script -> Versioned script -> Versioned script Source #

Show script => Show (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

showsPrec :: Int -> Versioned script -> ShowS Source #

show :: Versioned script -> String Source #

showList :: [Versioned script] -> ShowS Source #

Generic (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Associated Types

type Rep (Versioned script) :: Type -> Type Source #

Methods

from :: Versioned script -> Rep (Versioned script) x Source #

to :: Rep (Versioned script) x -> Versioned script Source #

Serialise script => Serialise (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

encode :: Versioned script -> Encoding

decode :: Decoder s (Versioned script)

encodeList :: [Versioned script] -> Encoding

decodeList :: Decoder s [Versioned script]

FromJSON script => FromJSON (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

parseJSON :: Value -> Parser (Versioned script)

parseJSONList :: Value -> Parser [Versioned script]

ToJSON script => ToJSON (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

toJSON :: Versioned script -> Value

toEncoding :: Versioned script -> Encoding

toJSONList :: [Versioned script] -> Value

toEncodingList :: [Versioned script] -> Encoding

Pretty script => Pretty (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

Methods

pretty :: Versioned script -> Doc ann #

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

type Rep (Versioned script) 
Instance details

Defined in Plutus.Script.Utils.Scripts

type Rep (Versioned script) = D1 ('MetaData "Versioned" "Plutus.Script.Utils.Scripts" "plutus-script-utils-1.2.0.0-5TpLCy32WGLK5IaOxcwe9j" 'False) (C1 ('MetaCons "Versioned" 'PrefixI 'True) (S1 ('MetaSel ('Just "unversioned") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 script) :*: S1 ('MetaSel ('Just "version") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Language)))