git-annex/Command/Sim.hs

76 lines
2.1 KiB
Haskell
Raw Normal View History

{- git-annex command
-
- Copyright 2024 Joey Hess <id@joeyh.name>
-
- Licensed under the GNU AGPL version 3 or higher.
-}
{-# LANGUAGE OverloadedStrings #-}
module Command.Sim where
import Command
import Annex.Sim
2024-09-11 15:53:25 +00:00
import Annex.Sim.File
import Annex.Perms
import System.Random
cmd :: Command
cmd = command "sim" SectionTesting
"simulate a network of repositories"
paramCommand (withParams seek)
seek :: CmdParams -> CommandSeek
seek ("start":[]) = start Nothing
seek ("start":simfile:[]) = start (Just simfile)
seek ("end":[]) = do
2024-09-12 20:39:44 +00:00
simdir <- fromRawFilePath <$> fromRepo gitAnnexSimDir
whenM (liftIO $ doesDirectoryExist simdir) $ do
liftIO $ removeDirectoryRecursive simdir
2024-09-17 17:43:11 +00:00
showLongNote $ UnquotedString "Sim ended."
seek ("show":[]) = do
simdir <- fromRepo gitAnnexSimDir
liftIO (restoreSim simdir) >>= \case
Left err -> giveup err
2024-09-20 18:57:55 +00:00
Right st -> liftIO $ putStr $ generateSimFile $
reverse $ simHistory st
seek ps = case parseSimCommand ps of
Left err -> giveup err
Right simcmd -> do
repobyname <- mkGetExistingRepoByName
simdir <- fromRepo gitAnnexSimDir
liftIO (restoreSim simdir) >>= \case
Left err -> giveup err
2024-09-20 18:57:55 +00:00
Right st ->
runSimCommand simcmd repobyname st
2024-09-20 18:57:55 +00:00
>>= liftIO . suspendSim
start :: Maybe FilePath -> CommandSeek
start simfile = do
simdir <- fromRawFilePath <$> fromRepo gitAnnexSimDir
whenM (liftIO $ doesDirectoryExist simdir) $
giveup "A sim was previously started. Use `git-annex sim end` to stop it before starting a new one."
2024-09-20 19:39:52 +00:00
showLongNote $ UnquotedString "Sim started."
rng <- fst . random <$> initStdGen
2024-09-20 18:57:55 +00:00
let st = emptySimState rng simdir
case simfile of
Nothing -> startup simdir st []
2024-09-12 20:39:44 +00:00
Just f -> liftIO (readFile f) >>= \c ->
case parseSimFile c of
Left err -> giveup err
Right cs -> startup simdir st cs
where
startup simdir st cs = do
repobyname <- mkGetExistingRepoByName
createAnnexDirectory (toRawFilePath simdir)
let st' = recordSeed st cs
st'' <- go st' repobyname cs
2024-09-20 18:57:55 +00:00
liftIO $ suspendSim st''
go st _ [] = return st
go st repobyname (c:cs) = do
st' <- runSimCommand c repobyname st
go st' repobyname cs