jsonnet-0.2.0.0: Jsonnet implementaton in pure Haskell
Safe HaskellNone
LanguageHaskell2010

Language.Jsonnet.TH

Documentation

Orphan instances

Lift Scientific Source # 
Instance details

Methods

lift :: Quote m => Scientific -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Scientific -> Code m Scientific #

Lift SrcSpan Source # 
Instance details

Methods

lift :: Quote m => SrcSpan -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => SrcSpan -> Code m SrcSpan #

Lift Literal Source # 
Instance details

Methods

lift :: Quote m => Literal -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Literal -> Code m Literal #

Lift Strictness Source # 
Instance details

Methods

lift :: Quote m => Strictness -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Strictness -> Code m Strictness #

Lift LogicalOp Source # 
Instance details

Methods

lift :: Quote m => LogicalOp -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => LogicalOp -> Code m LogicalOp #

Lift BitwiseOp Source # 
Instance details

Methods

lift :: Quote m => BitwiseOp -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => BitwiseOp -> Code m BitwiseOp #

Lift CompOp Source # 
Instance details

Methods

lift :: Quote m => CompOp -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => CompOp -> Code m CompOp #

Lift ArithOp Source # 
Instance details

Methods

lift :: Quote m => ArithOp -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => ArithOp -> Code m ArithOp #

Lift UnyOp Source # 
Instance details

Methods

lift :: Quote m => UnyOp -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => UnyOp -> Code m UnyOp #

Lift BinOp Source # 
Instance details

Methods

lift :: Quote m => BinOp -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => BinOp -> Code m BinOp #

Lift Visibility Source # 
Instance details

Methods

lift :: Quote m => Visibility -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Visibility -> Code m Visibility #

Lift Expr Source # 
Instance details

Methods

lift :: Quote m => Expr -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Expr -> Code m Expr #

Data a => Lift (Arg a :: Type) Source # 
Instance details

Methods

lift :: Quote m => Arg a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Arg a -> Code m (Arg a) #

Data a => Lift (Args a :: Type) Source # 
Instance details

Methods

lift :: Quote m => Args a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Args a -> Code m (Args a) #

Data a => Lift (Assert a :: Type) Source # 
Instance details

Methods

lift :: Quote m => Assert a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Assert a -> Code m (Assert a) #

Data a => Lift (CompSpec a :: Type) Source # 
Instance details

Methods

lift :: Quote m => CompSpec a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => CompSpec a -> Code m (CompSpec a) #

Data a => Lift (Hideable a :: Type) Source # 
Instance details

Methods

lift :: Quote m => Hideable a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Hideable a -> Code m (Hideable a) #

Data a => Lift (Field a :: Type) Source # 
Instance details

Methods

lift :: Quote m => Field a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Field a -> Code m (Field a) #

Data a => Lift (ExprF a :: Type) Source # 
Instance details

Methods

lift :: Quote m => ExprF a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => ExprF a -> Code m (ExprF a) #

(Typeable a, Typeable f, Typeable g, Data (f a), Data (g a)) => Lift (Product f g a :: Type) Source # 
Instance details

Methods

lift :: Quote m => Product f g a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Product f g a -> Code m (Product f g a) #