inferno-vc-0.1.0: Version control server for Inferno
Safe HaskellSafe-Inferred
LanguageHaskell2010

Inferno.VersionControl.Server

Documentation

newtype VCServerError Source #

Constructors

VCServerError 

Instances

Instances details
FromJSON VCServerError Source # 
Instance details

Defined in Inferno.VersionControl.Server

ToJSON VCServerError Source # 
Instance details

Defined in Inferno.VersionControl.Server

Generic VCServerError Source # 
Instance details

Defined in Inferno.VersionControl.Server

Associated Types

type Rep VCServerError :: Type -> Type #

Show VCServerError Source # 
Instance details

Defined in Inferno.VersionControl.Server

type Rep VCServerError Source # 
Instance details

Defined in Inferno.VersionControl.Server

type Rep VCServerError = D1 ('MetaData "VCServerError" "Inferno.VersionControl.Server" "inferno-vc-0.1.0-KyAO1GZuiEv4oyOIVKzzQ6" 'True) (C1 ('MetaCons "VCServerError" 'PrefixI 'True) (S1 ('MetaSel ('Just "serverError") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VCStoreError)))

type VersionControlAPI a g = ("fetch" :> ("function" :> (Capture "hash" VCObjectHash :> GetThrowingVCStoreError '[JSON] (VCMeta a g (Expr (Pinned VCObjectHash) (), TCScheme))))) :<|> (("fetch" :> ("functions" :> (ReqBody '[JSON] (Set g) :> PostThrowingVCStoreError '[JSON] [VCMeta a g VCObjectHash]))) :<|> (("fetch" :> (Capture "hash" VCObjectHash :> GetThrowingVCStoreError '[JSON] (VCMeta a g VCObject))) :<|> (("fetch" :> (Capture "hash" VCObjectHash :> ("history" :> GetThrowingVCStoreError '[JSON] [VCMeta a g VCObjectHash]))) :<|> (("fetch" :> ("objects" :> (ReqBody '[JSON] [VCObjectHash] :> PostThrowingVCStoreError '[JSON] (Map VCObjectHash (VCMeta a g VCObject))))) :<|> (("fetch" :> ("object" :> (Capture "hash" VCObjectHash :> ("closure" :> ("hashes" :> GetThrowingVCStoreError '[JSON] [VCObjectHash]))))) :<|> (("push" :> ("function" :> (ReqBody '[JSON] (VCMeta a g (Expr (Pinned VCObjectHash) (), TCScheme)) :> PostThrowingVCStoreError '[JSON] VCObjectHash))) :<|> (("delete" :> ("autosave" :> ("function" :> (ReqBody '[JSON] VCObjectHash :> DeleteThrowingVCStoreError '[JSON] ())))) :<|> ("delete" :> ("scripts" :> (Capture "hash" VCObjectHash :> DeleteThrowingVCStoreError '[JSON] ())))))))))) Source #

runServer :: forall proxy a g. (VCHashUpdate a, VCHashUpdate g, FromJSON a, FromJSON g, ToJSON a, ToJSON g, Ord g) => proxy a -> proxy g -> IO () Source #

runServerConfig :: forall proxy a g. (VCHashUpdate a, VCHashUpdate g, FromJSON a, FromJSON g, ToJSON a, ToJSON g, Ord g) => proxy a -> proxy g -> ServerConfig -> IO () Source #

withLinkedAsync_ :: IO a -> IO b -> IO b Source #