plutus-tx-1.0.0.0: Libraries for Plutus Tx and its prelude
Safe HaskellNone
LanguageHaskell2010

PlutusTx.Lift.Class

Synopsis

Documentation

class Typeable uni (a :: k) where Source #

Class for types which have a corresponding Plutus IR type. Instances should always be derived, do not write your own instance!

Methods

typeRep :: Proxy a -> RTCompile uni fun (Type TyName uni ()) Source #

Get the Plutus IR type corresponding to this type.

Instances

Instances details
(Typeable uni f, Typeable uni a) => Typeable uni (f a :: k) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy (f a) -> RTCompile uni fun (Type TyName uni ()) Source #

Includes uni Text => Typeable uni BuiltinString Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy BuiltinString -> RTCompile uni fun (Type TyName uni ()) Source #

Includes uni ByteString => Typeable uni BuiltinByteString Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy BuiltinByteString -> RTCompile uni fun (Type TyName uni ()) Source #

Includes uni Data => Typeable uni BuiltinData Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy BuiltinData -> RTCompile uni fun (Type TyName uni ()) Source #

Includes uni ByteString => Typeable uni ByteString Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy ByteString -> RTCompile uni fun (Type TyName uni ()) Source #

Includes uni Integer => Typeable uni Integer Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy Integer -> RTCompile uni fun (Type TyName uni ()) Source #

(TypeError ('Text "Int is not supported, use Integer instead") :: Constraint) => Typeable uni Int Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy Int -> RTCompile uni fun (Type TyName uni ()) Source #

Typeable DefaultUni Bool Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy Bool -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni () Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

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

Typeable DefaultUni Data Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy Data -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni Rational Source # 
Instance details

Defined in PlutusTx.Ratio

Methods

typeRep :: Proxy Rational -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni Sqrt Source # 
Instance details

Defined in PlutusTx.Sqrt

Methods

typeRep :: Proxy Sqrt -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni (,,,,) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy (,,,,) -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni (,,,) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy (,,,) -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni (,,) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy (,,) -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni Either Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy Either -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni (,) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy (,) -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni Map Source # 
Instance details

Defined in PlutusTx.AssocMap

Methods

typeRep :: Proxy Map -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni [] Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy [] -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable DefaultUni Maybe Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy Maybe -> RTCompile DefaultUni fun (Type TyName DefaultUni ()) Source #

Typeable uni ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

typeRep :: Proxy (->) -> RTCompile uni fun (Type0 TyName uni ()) Source #

class Lift uni a where Source #

Class for types which can be lifted into Plutus IR. Instances should be derived, do not write your own instance!

Methods

lift :: a -> RTCompile uni fun (Term TyName Name uni fun ()) Source #

Get a Plutus IR term corresponding to the given value.

Instances

Instances details
Includes uni Text => Lift uni BuiltinString Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: BuiltinString -> RTCompile uni fun (Term TyName Name uni fun ()) Source #

Includes uni ByteString => Lift uni BuiltinByteString Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: BuiltinByteString -> RTCompile uni fun (Term TyName Name uni fun ()) Source #

Includes uni Data => Lift uni BuiltinData Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: BuiltinData -> RTCompile uni fun (Term TyName Name uni fun ()) Source #

Includes uni ByteString => Lift uni ByteString Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: ByteString -> RTCompile uni fun (Term TyName Name uni fun ()) Source #

Includes uni Integer => Lift uni Integer Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: Integer -> RTCompile uni fun (Term TyName Name uni fun ()) Source #

(TypeError ('Text "Int is not supported, use Integer instead") :: Constraint) => Lift uni Int Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: Int -> RTCompile uni fun (Term TyName Name uni fun ()) Source #

Lift DefaultUni Bool Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: Bool -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

Lift DefaultUni () Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

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

Lift DefaultUni Data Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: Data -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

Lift DefaultUni Rational Source # 
Instance details

Defined in PlutusTx.Ratio

Methods

lift :: Rational -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

Lift DefaultUni Sqrt Source # 
Instance details

Defined in PlutusTx.Sqrt

Methods

lift :: Sqrt -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

(FromBuiltin arep a, Includes uni [a]) => Lift uni (BuiltinList arep) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: BuiltinList arep -> RTCompile uni fun (Term TyName Name uni fun ()) Source #

(Typeable DefaultUni a, Lift DefaultUni a) => Lift DefaultUni [a] Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: [a] -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

(Typeable DefaultUni a, Lift DefaultUni a) => Lift DefaultUni (Maybe a) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: Maybe a -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

(Typeable DefaultUni a, Typeable DefaultUni b, Lift DefaultUni a, Lift DefaultUni b) => Lift DefaultUni (Either a b) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: Either a b -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

(Typeable DefaultUni a, Typeable DefaultUni b, Lift DefaultUni a, Lift DefaultUni b) => Lift DefaultUni (a, b) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: (a, b) -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

Lift DefaultUni [(k, v)] => Lift DefaultUni (Map k v) Source # 
Instance details

Defined in PlutusTx.AssocMap

Methods

lift :: Map k v -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

(Typeable DefaultUni a, Typeable DefaultUni b, Typeable DefaultUni c, Lift DefaultUni a, Lift DefaultUni b, Lift DefaultUni c) => Lift DefaultUni (a, b, c) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: (a, b, c) -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

(Typeable DefaultUni a, Typeable DefaultUni b, Typeable DefaultUni c, Typeable DefaultUni d, Lift DefaultUni a, Lift DefaultUni b, Lift DefaultUni c, Lift DefaultUni d) => Lift DefaultUni (a, b, c, d) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: (a, b, c, d) -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

(Typeable DefaultUni a, Typeable DefaultUni b, Typeable DefaultUni c, Typeable DefaultUni d, Typeable DefaultUni e, Lift DefaultUni a, Lift DefaultUni b, Lift DefaultUni c, Lift DefaultUni d, Lift DefaultUni e) => Lift DefaultUni (a, b, c, d, e) Source # 
Instance details

Defined in PlutusTx.Lift.Instances

Methods

lift :: (a, b, c, d, e) -> RTCompile DefaultUni fun (Term TyName Name DefaultUni fun ()) Source #

type RTCompile uni fun = DefT Name uni fun () Quote Source #

withTyVars :: MonadReader (LocalVars uni) m => [(Name, TyVarDecl TyName ())] -> m a -> m a Source #

data LiftError Source #

Instances

Instances details
Show LiftError Source # 
Instance details

Defined in PlutusTx.Lift.Class

Exception LiftError Source # 
Instance details

Defined in PlutusTx.Lift.Class

Pretty LiftError Source # 
Instance details

Defined in PlutusTx.Lift.Class

Methods

pretty :: LiftError -> Doc ann

prettyList :: [LiftError] -> Doc ann

HasErrorCode LiftError Source # 
Instance details

Defined in PlutusTx.Lift.Class

Methods

errorCode :: LiftError -> ErrorCode