inferno-core-0.1.0.0: A statically-typed functional scripting language
Safe HaskellSafe-Inferred
LanguageHaskell2010

Inferno.Module

Synopsis

Documentation

data Module objs #

Instances

Instances details
FromJSON objs => FromJSON (Module objs) 
Instance details

Defined in Inferno.Types.Module

Methods

parseJSON :: Value -> Parser (Module objs) #

parseJSONList :: Value -> Parser [Module objs] #

ToJSON objs => ToJSON (Module objs) 
Instance details

Defined in Inferno.Types.Module

Methods

toJSON :: Module objs -> Value #

toEncoding :: Module objs -> Encoding #

toJSONList :: [Module objs] -> Value #

toEncodingList :: [Module objs] -> Encoding #

Generic (Module objs) 
Instance details

Defined in Inferno.Types.Module

Associated Types

type Rep (Module objs) :: Type -> Type #

Methods

from :: Module objs -> Rep (Module objs) x #

to :: Rep (Module objs) x -> Module objs #

Eq objs => Eq (Module objs) 
Instance details

Defined in Inferno.Types.Module

Methods

(==) :: Module objs -> Module objs -> Bool #

(/=) :: Module objs -> Module objs -> Bool #

VCHashUpdate objs => VCHashUpdate (Module objs) 
Instance details

Defined in Inferno.Types.Module

Methods

(&<) :: Context SHA256 -> Module objs -> Context SHA256 #

type Rep (Module objs) 
Instance details

Defined in Inferno.Types.Module

type Rep (Module objs) = D1 ('MetaData "Module" "Inferno.Types.Module" "inferno-types-0.1.0.0-EKMmIlZ8z5b3mVEUhFR81D" 'False) (C1 ('MetaCons "Module" 'PrefixI 'True) ((S1 ('MetaSel ('Just "moduleName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName) :*: S1 ('MetaSel ('Just "moduleOpsTable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OpsTable)) :*: (S1 ('MetaSel ('Just "moduleTypeClasses") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set TypeClass)) :*: S1 ('MetaSel ('Just "moduleObjects") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 objs))))

newtype BuiltinModuleHash #

Instances

Instances details
Generic BuiltinModuleHash 
Instance details

Defined in Inferno.Types.Module

Associated Types

type Rep BuiltinModuleHash :: Type -> Type #

VCHashUpdate BuiltinModuleHash 
Instance details

Defined in Inferno.Types.Module

type Rep BuiltinModuleHash 
Instance details

Defined in Inferno.Types.Module

type Rep BuiltinModuleHash = D1 ('MetaData "BuiltinModuleHash" "Inferno.Types.Module" "inferno-types-0.1.0.0-EKMmIlZ8z5b3mVEUhFR81D" 'True) (C1 ('MetaCons "BuiltinModuleHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)))

newtype BuiltinFunHash #

Constructors

BuiltinFunHash (Expr () (), TCScheme) 

Instances

Instances details
Generic BuiltinFunHash 
Instance details

Defined in Inferno.Types.Module

Associated Types

type Rep BuiltinFunHash :: Type -> Type #

VCHashUpdate BuiltinFunHash 
Instance details

Defined in Inferno.Types.Module

type Rep BuiltinFunHash 
Instance details

Defined in Inferno.Types.Module

type Rep BuiltinFunHash = D1 ('MetaData "BuiltinFunHash" "Inferno.Types.Module" "inferno-types-0.1.0.0-EKMmIlZ8z5b3mVEUhFR81D" 'True) (C1 ('MetaCons "BuiltinFunHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr () (), TCScheme))))

newtype BuiltinEnumHash #

Instances

Instances details
Generic BuiltinEnumHash 
Instance details

Defined in Inferno.Types.Module

Associated Types

type Rep BuiltinEnumHash :: Type -> Type #

VCHashUpdate BuiltinEnumHash 
Instance details

Defined in Inferno.Types.Module

type Rep BuiltinEnumHash 
Instance details

Defined in Inferno.Types.Module

type Rep BuiltinEnumHash = D1 ('MetaData "BuiltinEnumHash" "Inferno.Types.Module" "inferno-types-0.1.0.0-EKMmIlZ8z5b3mVEUhFR81D" 'True) (C1 ('MetaCons "BuiltinEnumHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TCScheme)))

class ToValue c m a where Source #

Types that can be converted to script values, allowing IO in the process.

Methods

toValue :: MonadError EvalError m => a -> m (Value c m) Source #

Instances

Instances details
ToValue c m CTime Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: CTime -> m (Value c m) Source #

ToValue c m Int64 Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Int64 -> m (Value c m) Source #

ToValue c m Word16 Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Word16 -> m (Value c m) Source #

ToValue c m Word32 Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Word32 -> m (Value c m) Source #

ToValue c m Word64 Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Word64 -> m (Value c m) Source #

ToValue c m Lit Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Lit -> m (Value c m) Source #

ToValue c m Text Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Text -> m (Value c m) Source #

ToValue c m Integer Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Integer -> m (Value c m) Source #

ToValue c m () Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: () -> m (Value c m) Source #

ToValue c m Bool Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Bool -> m (Value c m) Source #

ToValue c m Double Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Double -> m (Value c m) Source #

ToValue c m Int Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Int -> m (Value c m) Source #

ToValue c m a => ToValue c m (Maybe a) Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Maybe a -> m (Value c m) Source #

ToValue c m a => ToValue c m [a] Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: [a] -> m (Value c m) Source #

ToValue c m (m (Value c m)) Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: m (Value c m) -> m (Value c m) Source #

(ToValue c m a, ToValue c m b) => ToValue c m (Either a b) Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Either a b -> m (Value c m) Source #

ToValue c m (Value c m) Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: Value c m -> m (Value c m) Source #

(FromValue c m a, ToValue c m b) => ToValue c m (a -> b) Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: (a -> b) -> m (Value c m) Source #

(Monad m, FromValue c (ImplEnvM m c) a1, FromValue c (ImplEnvM m c) a2, ToValue c (ImplEnvM m c) a3, KnownSymbol lbl) => ToValue c (ImplEnvM m c) (ImplicitCast lbl a1 a2 a3) Source # 
Instance details

Defined in Inferno.Module.Cast

Methods

toValue :: ImplicitCast lbl a1 a2 a3 -> ImplEnvM m c (Value c (ImplEnvM m c)) Source #