2011-06-29 15:55:16 +00:00
|
|
|
{- git ls-files interface
|
|
|
|
-
|
2020-05-28 19:55:17 +00:00
|
|
|
- Copyright 2010-2020 Joey Hess <id@joeyh.name>
|
2011-06-29 15:55:16 +00:00
|
|
|
-
|
2019-03-13 19:48:14 +00:00
|
|
|
- Licensed under the GNU AGPL version 3 or higher.
|
2011-06-29 15:55:16 +00:00
|
|
|
-}
|
|
|
|
|
2011-06-30 17:16:57 +00:00
|
|
|
module Git.LsFiles (
|
2020-05-28 19:55:17 +00:00
|
|
|
Options(..),
|
2011-06-29 15:55:16 +00:00
|
|
|
inRepo,
|
2018-10-19 21:51:25 +00:00
|
|
|
inRepoOrBranch,
|
2011-06-29 15:55:16 +00:00
|
|
|
notInRepo,
|
2018-05-14 18:58:13 +00:00
|
|
|
notInRepoIncludingEmptyDirectories,
|
2013-08-22 14:20:03 +00:00
|
|
|
allFiles,
|
2012-12-24 18:24:13 +00:00
|
|
|
deleted,
|
2013-02-20 18:12:55 +00:00
|
|
|
modified,
|
2011-06-29 15:55:16 +00:00
|
|
|
staged,
|
|
|
|
stagedNotDeleted,
|
2012-12-12 23:20:38 +00:00
|
|
|
stagedDetails,
|
2011-06-29 15:55:16 +00:00
|
|
|
typeChanged,
|
|
|
|
typeChangedStaged,
|
2012-06-27 16:09:01 +00:00
|
|
|
Conflicting(..),
|
|
|
|
Unmerged(..),
|
|
|
|
unmerged,
|
2013-10-23 16:58:01 +00:00
|
|
|
StagedDetails,
|
2019-11-06 19:37:18 +00:00
|
|
|
inodeCaches,
|
2011-06-29 15:55:16 +00:00
|
|
|
) where
|
|
|
|
|
2011-12-20 18:37:53 +00:00
|
|
|
import Common
|
2011-06-30 17:16:57 +00:00
|
|
|
import Git
|
2011-12-14 19:56:11 +00:00
|
|
|
import Git.Command
|
2012-06-27 13:27:59 +00:00
|
|
|
import Git.Types
|
|
|
|
import Git.Sha
|
2019-11-06 18:23:00 +00:00
|
|
|
import Utility.InodeCache
|
|
|
|
import Utility.TimeStamp
|
2011-06-29 15:55:16 +00:00
|
|
|
|
2013-09-19 18:48:42 +00:00
|
|
|
import Numeric
|
2020-04-07 17:27:11 +00:00
|
|
|
import Data.Char
|
2013-09-19 18:48:42 +00:00
|
|
|
import System.Posix.Types
|
2019-11-06 18:23:00 +00:00
|
|
|
import qualified Data.Map as M
|
2020-04-07 17:27:11 +00:00
|
|
|
import qualified Data.ByteString as S
|
2013-09-19 18:48:42 +00:00
|
|
|
|
2020-03-09 19:55:00 +00:00
|
|
|
{- It's only safe to use git ls-files on the current repo, not on a remote.
|
|
|
|
-
|
|
|
|
- Git has some strange behavior when git ls-files is used with repos
|
|
|
|
- that are not the one that the cwd is in:
|
|
|
|
- git --git-dir=../foo/.git --worktree=../foo ../foo fails saying
|
|
|
|
- "../foo is outside repository".
|
|
|
|
- That does not happen when an absolute path is provided.
|
|
|
|
-
|
|
|
|
- Also, the files output by ls-files are relative to the cwd.
|
|
|
|
- Unless it's run on remote. Then it's relative to the top of the remote
|
|
|
|
- repo.
|
|
|
|
-
|
|
|
|
- So, best to avoid that class of problems.
|
|
|
|
-}
|
|
|
|
safeForLsFiles :: Repo -> Bool
|
|
|
|
safeForLsFiles r = isNothing (remoteName r)
|
|
|
|
|
|
|
|
guardSafeForLsFiles :: Repo -> IO a -> IO a
|
|
|
|
guardSafeForLsFiles r a
|
|
|
|
| safeForLsFiles r = a
|
|
|
|
| otherwise = error $ "git ls-files is unsafe to run on repository " ++ repoDescribe r
|
|
|
|
|
2020-05-28 19:55:17 +00:00
|
|
|
data Options = ErrorUnmatch
|
|
|
|
|
2020-03-09 17:31:51 +00:00
|
|
|
{- Lists files that are checked into git's index at the specified paths.
|
|
|
|
- With no paths, all files are listed.
|
|
|
|
-}
|
2020-05-28 19:55:17 +00:00
|
|
|
inRepo :: [Options] -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
|
|
|
inRepo = inRepo' [Param "--cached"]
|
2018-10-19 21:51:25 +00:00
|
|
|
|
2020-05-28 19:55:17 +00:00
|
|
|
inRepo' :: [CommandParam] -> [Options] -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
|
|
|
inRepo' ps os l repo = guardSafeForLsFiles repo $ pipeNullSplit' params repo
|
2019-11-25 20:18:19 +00:00
|
|
|
where
|
|
|
|
params =
|
|
|
|
Param "ls-files" :
|
|
|
|
Param "-z" :
|
2020-05-28 19:55:17 +00:00
|
|
|
map op os ++ ps ++
|
2019-11-25 20:18:19 +00:00
|
|
|
(Param "--" : map (File . fromRawFilePath) l)
|
2020-05-28 19:55:17 +00:00
|
|
|
op ErrorUnmatch = Param "--error-unmatch"
|
2018-10-19 21:51:25 +00:00
|
|
|
|
|
|
|
{- Files that are checked into the index or have been committed to a
|
|
|
|
- branch. -}
|
2020-05-28 19:55:17 +00:00
|
|
|
inRepoOrBranch :: Branch -> [Options] -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
|
|
|
inRepoOrBranch b = inRepo'
|
|
|
|
[ Param "--cached"
|
|
|
|
, Param ("--with-tree=" ++ fromRef b)
|
|
|
|
]
|
2011-06-29 15:55:16 +00:00
|
|
|
|
2011-09-25 18:37:13 +00:00
|
|
|
{- Scans for files at the specified locations that are not checked into git. -}
|
2020-05-28 19:55:17 +00:00
|
|
|
notInRepo :: [Options] -> Bool -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
2018-05-14 18:58:13 +00:00
|
|
|
notInRepo = notInRepo' []
|
|
|
|
|
2020-05-28 19:55:17 +00:00
|
|
|
notInRepo' :: [CommandParam] -> [Options] -> Bool -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
|
|
|
notInRepo' ps os include_ignored =
|
|
|
|
inRepo' (Param "--others" : ps ++ exclude) os
|
2012-12-12 17:20:58 +00:00
|
|
|
where
|
|
|
|
exclude
|
|
|
|
| include_ignored = []
|
|
|
|
| otherwise = [Param "--exclude-standard"]
|
2011-06-29 15:55:16 +00:00
|
|
|
|
2018-05-14 18:58:13 +00:00
|
|
|
{- Scans for files at the specified locations that are not checked into
|
|
|
|
- git. Empty directories are included in the result. -}
|
2020-05-28 19:55:17 +00:00
|
|
|
notInRepoIncludingEmptyDirectories :: [Options] -> Bool -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
2018-05-14 18:58:13 +00:00
|
|
|
notInRepoIncludingEmptyDirectories = notInRepo' [Param "--directory"]
|
|
|
|
|
2013-08-22 14:20:03 +00:00
|
|
|
{- Finds all files in the specified locations, whether checked into git or
|
|
|
|
- not. -}
|
2020-05-28 19:55:17 +00:00
|
|
|
allFiles :: [Options] -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
|
|
|
allFiles = inRepo' [Param "--cached", Param "--others"]
|
2013-08-22 14:20:03 +00:00
|
|
|
|
2012-12-24 18:24:13 +00:00
|
|
|
{- Returns a list of files in the specified locations that have been
|
|
|
|
- deleted. -}
|
2020-05-28 19:55:17 +00:00
|
|
|
deleted :: [Options] -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
|
|
|
deleted = inRepo' [Param "--deleted"]
|
2012-12-24 18:24:13 +00:00
|
|
|
|
2013-02-20 18:12:55 +00:00
|
|
|
{- Returns a list of files in the specified locations that have been
|
|
|
|
- modified. -}
|
2020-05-28 19:55:17 +00:00
|
|
|
modified :: [Options] -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
|
|
|
modified = inRepo' [Param "--modified"]
|
2013-02-20 18:12:55 +00:00
|
|
|
|
2011-06-29 15:55:16 +00:00
|
|
|
{- Returns a list of all files that are staged for commit. -}
|
2019-11-25 20:18:19 +00:00
|
|
|
staged :: [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
2011-11-08 19:34:10 +00:00
|
|
|
staged = staged' []
|
2011-06-29 15:55:16 +00:00
|
|
|
|
|
|
|
{- Returns a list of the files, staged for commit, that are being added,
|
|
|
|
- moved, or changed (but not deleted), from the specified locations. -}
|
2019-11-25 20:18:19 +00:00
|
|
|
stagedNotDeleted :: [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
2011-11-08 19:34:10 +00:00
|
|
|
stagedNotDeleted = staged' [Param "--diff-filter=ACMRT"]
|
2011-06-29 15:55:16 +00:00
|
|
|
|
2019-11-25 20:18:19 +00:00
|
|
|
staged' :: [CommandParam] -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
2020-03-09 19:55:00 +00:00
|
|
|
staged' ps l repo = guardSafeForLsFiles repo $
|
|
|
|
pipeNullSplit' (prefix ++ ps ++ suffix) repo
|
2012-12-12 17:20:58 +00:00
|
|
|
where
|
2015-06-01 17:52:23 +00:00
|
|
|
prefix = [Param "diff", Param "--cached", Param "--name-only", Param "-z"]
|
2019-11-25 20:18:19 +00:00
|
|
|
suffix = Param "--" : map (File . fromRawFilePath) l
|
2011-06-29 15:55:16 +00:00
|
|
|
|
2019-11-25 20:18:19 +00:00
|
|
|
type StagedDetails = (RawFilePath, Maybe Sha, Maybe FileMode)
|
2013-10-23 16:58:01 +00:00
|
|
|
|
2020-07-08 18:13:22 +00:00
|
|
|
{- Returns details about all files that are staged in the index.
|
|
|
|
-
|
|
|
|
- Note that, during a conflict, a file will appear in the list
|
|
|
|
- more than once.
|
|
|
|
-}
|
2019-11-25 20:18:19 +00:00
|
|
|
stagedDetails :: [RawFilePath] -> Repo -> IO ([StagedDetails], IO Bool)
|
2013-07-28 19:27:36 +00:00
|
|
|
stagedDetails = stagedDetails' []
|
|
|
|
|
2019-11-25 20:18:19 +00:00
|
|
|
stagedDetails' :: [CommandParam] -> [RawFilePath] -> Repo -> IO ([StagedDetails], IO Bool)
|
2020-03-09 19:55:00 +00:00
|
|
|
stagedDetails' ps l repo = guardSafeForLsFiles repo $ do
|
2020-04-07 17:27:11 +00:00
|
|
|
(ls, cleanup) <- pipeNullSplit' params repo
|
2020-01-07 15:35:17 +00:00
|
|
|
return (map parseStagedDetails ls, cleanup)
|
2012-12-12 17:25:26 +00:00
|
|
|
where
|
2015-06-01 17:52:23 +00:00
|
|
|
params = Param "ls-files" : Param "--stage" : Param "-z" : ps ++
|
2019-11-25 20:18:19 +00:00
|
|
|
Param "--" : map (File . fromRawFilePath) l
|
2020-01-07 15:35:17 +00:00
|
|
|
|
2020-04-07 17:27:11 +00:00
|
|
|
parseStagedDetails :: S.ByteString -> StagedDetails
|
2020-01-07 15:35:17 +00:00
|
|
|
parseStagedDetails s
|
2020-04-07 17:27:11 +00:00
|
|
|
| S.null file = (s, Nothing, Nothing)
|
|
|
|
| otherwise = (file, extractSha sha, readmode mode)
|
2020-01-07 15:35:17 +00:00
|
|
|
where
|
2020-04-07 17:27:11 +00:00
|
|
|
(metadata, file) = separate' (== fromIntegral (ord '\t')) s
|
|
|
|
(mode, metadata') = separate' (== fromIntegral (ord ' ')) metadata
|
|
|
|
(sha, _) = separate' (== fromIntegral (ord ' ')) metadata'
|
|
|
|
readmode = fst <$$> headMaybe . readOct . decodeBS'
|
2012-12-12 17:25:26 +00:00
|
|
|
|
2011-06-29 15:55:16 +00:00
|
|
|
{- Returns a list of the files in the specified locations that are staged
|
|
|
|
- for commit, and whose type has changed. -}
|
2019-11-25 20:18:19 +00:00
|
|
|
typeChangedStaged :: [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
2011-11-08 19:34:10 +00:00
|
|
|
typeChangedStaged = typeChanged' [Param "--cached"]
|
2011-06-29 15:55:16 +00:00
|
|
|
|
|
|
|
{- Returns a list of the files in the specified locations whose type has
|
|
|
|
- changed. Files only staged for commit will not be included. -}
|
2019-11-25 20:18:19 +00:00
|
|
|
typeChanged :: [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
2011-11-08 19:34:10 +00:00
|
|
|
typeChanged = typeChanged' []
|
2011-06-29 15:55:16 +00:00
|
|
|
|
2019-11-25 20:18:19 +00:00
|
|
|
typeChanged' :: [CommandParam] -> [RawFilePath] -> Repo -> IO ([RawFilePath], IO Bool)
|
2020-03-09 19:55:00 +00:00
|
|
|
typeChanged' ps l repo = guardSafeForLsFiles repo $ do
|
2012-10-04 23:56:32 +00:00
|
|
|
(fs, cleanup) <- pipeNullSplit (prefix ++ ps ++ suffix) repo
|
2012-02-14 04:22:42 +00:00
|
|
|
-- git diff returns filenames relative to the top of the git repo;
|
|
|
|
-- convert to filenames relative to the cwd, like git ls-files.
|
2019-12-09 17:49:05 +00:00
|
|
|
top <- absPath (fromRawFilePath (repoPath repo))
|
2014-06-10 23:20:14 +00:00
|
|
|
currdir <- getCurrentDirectory
|
2019-11-25 20:18:19 +00:00
|
|
|
return (map (\f -> toRawFilePath (relPathDirToFileAbs currdir $ top </> decodeBL' f)) fs, cleanup)
|
2012-12-12 17:20:58 +00:00
|
|
|
where
|
2015-06-01 17:52:23 +00:00
|
|
|
prefix =
|
|
|
|
[ Param "diff"
|
|
|
|
, Param "--name-only"
|
|
|
|
, Param "--diff-filter=T"
|
|
|
|
, Param "-z"
|
|
|
|
]
|
2019-11-25 20:18:19 +00:00
|
|
|
suffix = Param "--" : (if null l then [File "."] else map (File . fromRawFilePath) l)
|
2012-06-27 13:27:59 +00:00
|
|
|
|
2012-06-27 16:09:01 +00:00
|
|
|
{- A item in conflict has two possible values.
|
|
|
|
- Either can be Nothing, when that side deleted the file. -}
|
|
|
|
data Conflicting v = Conflicting
|
|
|
|
{ valUs :: Maybe v
|
|
|
|
, valThem :: Maybe v
|
|
|
|
} deriving (Show)
|
|
|
|
|
2012-06-27 13:27:59 +00:00
|
|
|
data Unmerged = Unmerged
|
2019-11-25 20:18:19 +00:00
|
|
|
{ unmergedFile :: RawFilePath
|
2018-05-14 18:22:44 +00:00
|
|
|
, unmergedTreeItemType :: Conflicting TreeItemType
|
2012-06-27 16:09:01 +00:00
|
|
|
, unmergedSha :: Conflicting Sha
|
2018-05-14 18:22:44 +00:00
|
|
|
}
|
2012-06-27 13:27:59 +00:00
|
|
|
|
|
|
|
{- Returns a list of the files in the specified locations that have
|
2012-06-27 16:09:01 +00:00
|
|
|
- unresolved merge conflicts.
|
|
|
|
-
|
|
|
|
- ls-files outputs multiple lines per conflicting file, each with its own
|
|
|
|
- stage number:
|
|
|
|
- 1 = old version, can be ignored
|
|
|
|
- 2 = us
|
|
|
|
- 3 = them
|
2012-12-24 18:24:13 +00:00
|
|
|
- If a line is omitted, that side removed the file.
|
2012-06-27 16:09:01 +00:00
|
|
|
-}
|
2019-11-25 20:18:19 +00:00
|
|
|
unmerged :: [RawFilePath] -> Repo -> IO ([Unmerged], IO Bool)
|
2020-03-09 19:55:00 +00:00
|
|
|
unmerged l repo = guardSafeForLsFiles repo $ do
|
2012-10-04 23:56:32 +00:00
|
|
|
(fs, cleanup) <- pipeNullSplit params repo
|
2019-11-25 20:18:19 +00:00
|
|
|
return (reduceUnmerged [] $ catMaybes $ map (parseUnmerged . decodeBL') fs, cleanup)
|
2012-12-12 17:20:58 +00:00
|
|
|
where
|
2015-06-01 17:52:23 +00:00
|
|
|
params =
|
|
|
|
Param "ls-files" :
|
|
|
|
Param "--unmerged" :
|
|
|
|
Param "-z" :
|
|
|
|
Param "--" :
|
2019-11-25 20:18:19 +00:00
|
|
|
map (File . fromRawFilePath) l
|
2012-06-27 16:09:01 +00:00
|
|
|
|
|
|
|
data InternalUnmerged = InternalUnmerged
|
|
|
|
{ isus :: Bool
|
2019-11-25 20:18:19 +00:00
|
|
|
, ifile :: RawFilePath
|
2018-05-14 18:22:44 +00:00
|
|
|
, itreeitemtype :: Maybe TreeItemType
|
2012-06-27 16:09:01 +00:00
|
|
|
, isha :: Maybe Sha
|
2018-05-14 18:22:44 +00:00
|
|
|
}
|
2012-06-27 16:09:01 +00:00
|
|
|
|
|
|
|
parseUnmerged :: String -> Maybe InternalUnmerged
|
|
|
|
parseUnmerged s
|
2012-10-18 04:45:22 +00:00
|
|
|
| null file = Nothing
|
|
|
|
| otherwise = case words metadata of
|
2018-05-14 18:22:44 +00:00
|
|
|
(rawtreeitemtype:rawsha:rawstage:_) -> do
|
2012-10-18 04:45:22 +00:00
|
|
|
stage <- readish rawstage :: Maybe Int
|
2015-04-19 04:38:29 +00:00
|
|
|
if stage /= 2 && stage /= 3
|
|
|
|
then Nothing
|
|
|
|
else do
|
2019-11-25 20:18:19 +00:00
|
|
|
treeitemtype <- readTreeItemType (encodeBS rawtreeitemtype)
|
2020-04-06 21:14:49 +00:00
|
|
|
sha <- extractSha (encodeBS' rawsha)
|
2019-11-25 20:18:19 +00:00
|
|
|
return $ InternalUnmerged (stage == 2) (toRawFilePath file)
|
2018-05-14 18:22:44 +00:00
|
|
|
(Just treeitemtype) (Just sha)
|
2012-10-18 04:45:22 +00:00
|
|
|
_ -> Nothing
|
2012-12-12 17:20:58 +00:00
|
|
|
where
|
|
|
|
(metadata, file) = separate (== '\t') s
|
2012-06-27 16:09:01 +00:00
|
|
|
|
|
|
|
reduceUnmerged :: [Unmerged] -> [InternalUnmerged] -> [Unmerged]
|
|
|
|
reduceUnmerged c [] = c
|
|
|
|
reduceUnmerged c (i:is) = reduceUnmerged (new:c) rest
|
2012-12-12 17:20:58 +00:00
|
|
|
where
|
|
|
|
(rest, sibi) = findsib i is
|
2018-05-14 18:22:44 +00:00
|
|
|
(treeitemtypeA, treeitemtypeB, shaA, shaB)
|
|
|
|
| isus i = (itreeitemtype i, itreeitemtype sibi, isha i, isha sibi)
|
|
|
|
| otherwise = (itreeitemtype sibi, itreeitemtype i, isha sibi, isha i)
|
2012-12-12 17:20:58 +00:00
|
|
|
new = Unmerged
|
|
|
|
{ unmergedFile = ifile i
|
2018-05-14 18:22:44 +00:00
|
|
|
, unmergedTreeItemType = Conflicting treeitemtypeA treeitemtypeB
|
2012-12-12 17:20:58 +00:00
|
|
|
, unmergedSha = Conflicting shaA shaB
|
|
|
|
}
|
2012-12-24 18:24:13 +00:00
|
|
|
findsib templatei [] = ([], removed templatei)
|
2012-12-12 17:20:58 +00:00
|
|
|
findsib templatei (l:ls)
|
|
|
|
| ifile l == ifile templatei = (ls, l)
|
2012-12-24 18:24:13 +00:00
|
|
|
| otherwise = (l:ls, removed templatei)
|
|
|
|
removed templatei = templatei
|
2012-12-12 17:20:58 +00:00
|
|
|
{ isus = not (isus templatei)
|
2018-05-14 18:22:44 +00:00
|
|
|
, itreeitemtype = Nothing
|
2012-12-12 17:20:58 +00:00
|
|
|
, isha = Nothing
|
|
|
|
}
|
2019-11-06 18:23:00 +00:00
|
|
|
|
|
|
|
{- Gets the InodeCache equivilant information stored in the git index.
|
|
|
|
-
|
|
|
|
- Note that this uses a --debug option whose output could change at some
|
|
|
|
- point in the future. If the output is not as expected, will use Nothing.
|
|
|
|
-}
|
2019-12-06 19:17:54 +00:00
|
|
|
inodeCaches :: [RawFilePath] -> Repo -> IO ([(FilePath, Maybe InodeCache)], IO Bool)
|
2020-03-09 19:55:34 +00:00
|
|
|
inodeCaches locs repo = guardSafeForLsFiles repo $ do
|
2019-11-06 18:23:00 +00:00
|
|
|
(ls, cleanup) <- pipeNullSplit params repo
|
2019-12-06 19:17:54 +00:00
|
|
|
return (parse Nothing (map decodeBL ls), cleanup)
|
2019-11-06 18:23:00 +00:00
|
|
|
where
|
|
|
|
params =
|
|
|
|
Param "ls-files" :
|
|
|
|
Param "--cached" :
|
|
|
|
Param "-z" :
|
|
|
|
Param "--debug" :
|
|
|
|
Param "--" :
|
2019-12-06 19:17:54 +00:00
|
|
|
map (File . fromRawFilePath) locs
|
2019-11-06 18:23:00 +00:00
|
|
|
|
|
|
|
parse Nothing (f:ls) = parse (Just f) ls
|
|
|
|
parse (Just f) (s:[]) =
|
|
|
|
let i = parsedebug s
|
|
|
|
in (f, i) : []
|
|
|
|
parse (Just f) (s:ls) =
|
|
|
|
let (d, f') = splitdebug s
|
|
|
|
i = parsedebug d
|
|
|
|
in (f, i) : parse (Just f') ls
|
|
|
|
parse _ _ = []
|
|
|
|
|
|
|
|
-- First 5 lines are --debug output, remainder is the next filename.
|
|
|
|
-- This assumes that --debug does not start outputting more lines.
|
|
|
|
splitdebug s = case splitc '\n' s of
|
|
|
|
(d1:d2:d3:d4:d5:rest) ->
|
|
|
|
( intercalate "\n" [d1, d2, d3, d4, d5]
|
|
|
|
, intercalate "\n" rest
|
|
|
|
)
|
|
|
|
_ -> ("", s)
|
|
|
|
|
|
|
|
-- This parser allows for some changes to the --debug output,
|
|
|
|
-- including reordering, or adding more items.
|
|
|
|
parsedebug s = do
|
|
|
|
let l = words s
|
|
|
|
let iskey v = ":" `isSuffixOf` v
|
|
|
|
let m = M.fromList $ zip
|
|
|
|
(filter iskey l)
|
|
|
|
(filter (not . iskey) l)
|
|
|
|
mkInodeCache
|
|
|
|
<$> (readish =<< M.lookup "ino:" m)
|
|
|
|
<*> (readish =<< M.lookup "size:" m)
|
|
|
|
<*> (parsePOSIXTime =<< (replace ":" "." <$> M.lookup "mtime:" m))
|