Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
ProjectM36.Transaction.Persist
Synopsis
- getDirectoryNames :: FilePath -> IO [FilePath]
- tempTransactionDir :: FilePath -> TransactionId -> FilePath
- transactionDir :: FilePath -> TransactionId -> FilePath
- transactionInfoPath :: FilePath -> FilePath
- notificationsPath :: FilePath -> FilePath
- relvarsPath :: FilePath -> FilePath
- incDepsDir :: FilePath -> FilePath
- atomFuncsPath :: FilePath -> FilePath
- dbcFuncsPath :: FilePath -> FilePath
- typeConsPath :: FilePath -> FilePath
- subschemasPath :: FilePath -> FilePath
- registeredQueriesPath :: FilePath -> FilePath
- aggregateFunctionsPath :: FilePath -> FilePath
- objectFilesPath :: FilePath -> FilePath
- readTransaction :: FilePath -> TransactionId -> Maybe ScriptSession -> IO (Either PersistenceError Transaction)
- writeTransaction :: DiskSync -> FilePath -> Transaction -> IO ()
- writeRelVars :: DiskSync -> FilePath -> RelationVariables -> IO ()
- readRelVars :: FilePath -> IO RelationVariables
- writeFuncs :: Traversable t => DiskSync -> FilePath -> t (Function a) -> IO ()
- readFuncs :: FilePath -> FilePath -> HashSet (Function a) -> Maybe ScriptSession -> IO (HashSet (Function a))
- newtype ObjectFileInfo = ObjectFileInfo {
- _unFileInfo :: (FilePath, String, String)
- loadFunc :: FilePath -> HashSet (Function a) -> Maybe ScriptSession -> FunctionName -> [AtomType] -> Maybe FunctionBodyScript -> Maybe ObjectFileInfo -> IO (Function a)
- readAtomFunc :: FilePath -> FunctionName -> Maybe ScriptSession -> AtomFunctions -> IO AtomFunction
- writeIncDep :: DiskSync -> FilePath -> (IncDepName, InclusionDependency) -> IO ()
- writeIncDeps :: DiskSync -> FilePath -> Map IncDepName InclusionDependency -> IO ()
- readIncDep :: FilePath -> IncDepName -> IO (IncDepName, InclusionDependency)
- readIncDeps :: FilePath -> IO (Map IncDepName InclusionDependency)
- readSubschemas :: FilePath -> IO Subschemas
- writeSubschemas :: DiskSync -> FilePath -> Subschemas -> IO ()
- writeTypeConstructorMapping :: DiskSync -> FilePath -> TypeConstructorMapping -> IO ()
- readTypeConstructorMapping :: FilePath -> IO TypeConstructorMapping
- readRegisteredQueries :: FilePath -> IO RegisteredQueries
- writeRegisteredQueries :: DiskSync -> FilePath -> RegisteredQueries -> IO ()
- readNotifications :: FilePath -> IO Notifications
- writeNotifications :: DiskSync -> FilePath -> Notifications -> IO ()
Documentation
tempTransactionDir :: FilePath -> TransactionId -> FilePath Source #
transactionDir :: FilePath -> TransactionId -> FilePath Source #
notificationsPath :: FilePath -> FilePath Source #
relvarsPath :: FilePath -> FilePath Source #
incDepsDir :: FilePath -> FilePath Source #
atomFuncsPath :: FilePath -> FilePath Source #
dbcFuncsPath :: FilePath -> FilePath Source #
typeConsPath :: FilePath -> FilePath Source #
subschemasPath :: FilePath -> FilePath Source #
objectFilesPath :: FilePath -> FilePath Source #
where compiled modules are stored within the database directory
readTransaction :: FilePath -> TransactionId -> Maybe ScriptSession -> IO (Either PersistenceError Transaction) Source #
writeTransaction :: DiskSync -> FilePath -> Transaction -> IO () Source #
writeRelVars :: DiskSync -> FilePath -> RelationVariables -> IO () Source #
writeFuncs :: Traversable t => DiskSync -> FilePath -> t (Function a) -> IO () Source #
readFuncs :: FilePath -> FilePath -> HashSet (Function a) -> Maybe ScriptSession -> IO (HashSet (Function a)) Source #
newtype ObjectFileInfo Source #
Constructors
ObjectFileInfo | |
Fields
|
Instances
Show ObjectFileInfo Source # | |
Defined in ProjectM36.Transaction.Persist | |
Serialise ObjectFileInfo Source # | |
Defined in ProjectM36.Transaction.Persist |
loadFunc :: FilePath -> HashSet (Function a) -> Maybe ScriptSession -> FunctionName -> [AtomType] -> Maybe FunctionBodyScript -> Maybe ObjectFileInfo -> IO (Function a) Source #
readAtomFunc :: FilePath -> FunctionName -> Maybe ScriptSession -> AtomFunctions -> IO AtomFunction Source #
writeIncDep :: DiskSync -> FilePath -> (IncDepName, InclusionDependency) -> IO () Source #
writeIncDeps :: DiskSync -> FilePath -> Map IncDepName InclusionDependency -> IO () Source #
readIncDep :: FilePath -> IncDepName -> IO (IncDepName, InclusionDependency) Source #
readIncDeps :: FilePath -> IO (Map IncDepName InclusionDependency) Source #
readSubschemas :: FilePath -> IO Subschemas Source #
writeSubschemas :: DiskSync -> FilePath -> Subschemas -> IO () Source #
writeTypeConstructorMapping :: DiskSync -> FilePath -> TypeConstructorMapping -> IO () Source #
writeRegisteredQueries :: DiskSync -> FilePath -> RegisteredQueries -> IO () Source #
writeNotifications :: DiskSync -> FilePath -> Notifications -> IO () Source #