module Darcs.Util.Tree.Plain
(
readPlainTree
, writePlainTree
) where
import Control.Monad ( forM )
import Data.Maybe( catMaybes )
import qualified Data.ByteString.Lazy as BL
import System.FilePath( (</>) )
import System.Directory
( createDirectoryIfMissing
, listDirectory
, withCurrentDirectory
)
import System.Posix.Files
( getSymbolicLinkStatus, isDirectory, isRegularFile, FileStatus )
import Darcs.Prelude
import Darcs.Util.Path
import Darcs.Util.ByteString ( readSegment )
import Darcs.Util.Tree( Tree(), TreeItem(..)
, Blob(..), makeTree
, list, readBlob, expand )
readPlainDir :: FilePath -> IO [(FilePath, FileStatus)]
readPlainDir :: FilePath -> IO [(FilePath, FileStatus)]
readPlainDir FilePath
dir =
FilePath
-> IO [(FilePath, FileStatus)] -> IO [(FilePath, FileStatus)]
forall a. FilePath -> IO a -> IO a
withCurrentDirectory FilePath
dir (IO [(FilePath, FileStatus)] -> IO [(FilePath, FileStatus)])
-> IO [(FilePath, FileStatus)] -> IO [(FilePath, FileStatus)]
forall a b. (a -> b) -> a -> b
$ do
[FilePath]
items <- FilePath -> IO [FilePath]
listDirectory FilePath
"."
[FilePath]
-> (FilePath -> IO (FilePath, FileStatus))
-> IO [(FilePath, FileStatus)]
forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
t a -> (a -> m b) -> m (t b)
forM [FilePath]
items ((FilePath -> IO (FilePath, FileStatus))
-> IO [(FilePath, FileStatus)])
-> (FilePath -> IO (FilePath, FileStatus))
-> IO [(FilePath, FileStatus)]
forall a b. (a -> b) -> a -> b
$ \FilePath
s -> do
FileStatus
st <- FilePath -> IO FileStatus
getSymbolicLinkStatus FilePath
s
(FilePath, FileStatus) -> IO (FilePath, FileStatus)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (FilePath
s, FileStatus
st)
readPlainTree :: FilePath -> IO (Tree IO)
readPlainTree :: FilePath -> IO (Tree IO)
readPlainTree FilePath
dir = do
[(FilePath, FileStatus)]
items <- FilePath -> IO [(FilePath, FileStatus)]
readPlainDir FilePath
dir
let subs :: [(Name, TreeItem IO)]
subs = [Maybe (Name, TreeItem IO)] -> [(Name, TreeItem IO)]
forall a. [Maybe a] -> [a]
catMaybes [
let name :: Name
name = (FilePath -> Name)
-> (Name -> Name) -> Either FilePath Name -> Name
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either FilePath -> Name
forall a. HasCallStack => FilePath -> a
error Name -> Name
forall a. a -> a
id (Either FilePath Name -> Name) -> Either FilePath Name -> Name
forall a b. (a -> b) -> a -> b
$ FilePath -> Either FilePath Name
makeName FilePath
name'
in case FileStatus
status of
FileStatus
_ | FileStatus -> Bool
isDirectory FileStatus
status -> (Name, TreeItem IO) -> Maybe (Name, TreeItem IO)
forall a. a -> Maybe a
Just (Name
name, IO (Tree IO) -> Maybe Hash -> TreeItem IO
forall (m :: * -> *). m (Tree m) -> Maybe Hash -> TreeItem m
Stub (FilePath -> IO (Tree IO)
readPlainTree (FilePath
dir FilePath -> FilePath -> FilePath
</> FilePath
name')) Maybe Hash
forall a. Maybe a
Nothing)
FileStatus
_ | FileStatus -> Bool
isRegularFile FileStatus
status -> (Name, TreeItem IO) -> Maybe (Name, TreeItem IO)
forall a. a -> Maybe a
Just (Name
name, Blob IO -> TreeItem IO
forall (m :: * -> *). Blob m -> TreeItem m
File (Blob IO -> TreeItem IO) -> Blob IO -> TreeItem IO
forall a b. (a -> b) -> a -> b
$ IO ByteString -> Maybe Hash -> Blob IO
forall (m :: * -> *). m ByteString -> Maybe Hash -> Blob m
Blob (FilePath -> IO ByteString
readBlob' FilePath
name') Maybe Hash
forall a. Maybe a
Nothing)
FileStatus
_ -> Maybe (Name, TreeItem IO)
forall a. Maybe a
Nothing
| (FilePath
name', FileStatus
status) <- [(FilePath, FileStatus)]
items ]
Tree IO -> IO (Tree IO)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (Tree IO -> IO (Tree IO)) -> Tree IO -> IO (Tree IO)
forall a b. (a -> b) -> a -> b
$ [(Name, TreeItem IO)] -> Tree IO
forall (m :: * -> *). [(Name, TreeItem m)] -> Tree m
makeTree [(Name, TreeItem IO)]
subs
where readBlob' :: FilePath -> IO ByteString
readBlob' FilePath
name = FileSegment -> IO ByteString
readSegment (FilePath
dir FilePath -> FilePath -> FilePath
</> FilePath
name, Maybe (Int64, Int)
forall a. Maybe a
Nothing)
writePlainTree :: Tree IO -> FilePath -> IO ()
writePlainTree :: Tree IO -> FilePath -> IO ()
writePlainTree Tree IO
t FilePath
dir = do
Bool -> FilePath -> IO ()
createDirectoryIfMissing Bool
True FilePath
dir
Tree IO -> IO (Tree IO)
forall (m :: * -> *). Monad m => Tree m -> m (Tree m)
expand Tree IO
t IO (Tree IO) -> (Tree IO -> IO ()) -> IO ()
forall a b. IO a -> (a -> IO b) -> IO b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= ((AnchoredPath, TreeItem IO) -> IO ())
-> [(AnchoredPath, TreeItem IO)] -> IO ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (AnchoredPath, TreeItem IO) -> IO ()
write ([(AnchoredPath, TreeItem IO)] -> IO ())
-> (Tree IO -> [(AnchoredPath, TreeItem IO)]) -> Tree IO -> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Tree IO -> [(AnchoredPath, TreeItem IO)]
forall (m :: * -> *). Tree m -> [(AnchoredPath, TreeItem m)]
list
where write :: (AnchoredPath, TreeItem IO) -> IO ()
write (AnchoredPath
p, File Blob IO
b) = AnchoredPath -> Blob IO -> IO ()
write' AnchoredPath
p Blob IO
b
write (AnchoredPath
p, SubTree Tree IO
_) =
Bool -> FilePath -> IO ()
createDirectoryIfMissing Bool
True (FilePath -> AnchoredPath -> FilePath
anchorPath FilePath
dir AnchoredPath
p)
write (AnchoredPath, TreeItem IO)
_ = () -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
write' :: AnchoredPath -> Blob IO -> IO ()
write' AnchoredPath
p Blob IO
b = Blob IO -> IO ByteString
forall (m :: * -> *). Blob m -> m ByteString
readBlob Blob IO
b IO ByteString -> (ByteString -> IO ()) -> IO ()
forall a b. IO a -> (a -> IO b) -> IO b
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= FilePath -> ByteString -> IO ()
BL.writeFile (FilePath -> AnchoredPath -> FilePath
anchorPath FilePath
dir AnchoredPath
p)