2011-08-22 20:14:12 +00:00
|
|
|
{- path manipulation
|
|
|
|
-
|
|
|
|
- Copyright 2010-2011 Joey Hess <joey@kitenet.net>
|
|
|
|
-
|
|
|
|
- Licensed under the GNU GPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
|
|
|
module Utility.Path where
|
|
|
|
|
|
|
|
import Data.String.Utils
|
|
|
|
import System.Path
|
|
|
|
import System.FilePath
|
|
|
|
import System.Directory
|
|
|
|
import Data.List
|
|
|
|
import Data.Maybe
|
2011-08-25 04:28:55 +00:00
|
|
|
import Control.Applicative
|
2011-10-16 04:31:25 +00:00
|
|
|
import System.Posix.User
|
|
|
|
|
|
|
|
import Utility.Monad
|
2011-08-22 20:14:12 +00:00
|
|
|
|
|
|
|
{- Returns the parent directory of a path. Parent of / is "" -}
|
|
|
|
parentDir :: FilePath -> FilePath
|
2011-10-11 18:43:45 +00:00
|
|
|
parentDir dir
|
|
|
|
| not $ null dirs = slash ++ join s (init dirs)
|
|
|
|
| otherwise = ""
|
2011-08-22 20:14:12 +00:00
|
|
|
where
|
|
|
|
dirs = filter (not . null) $ split s dir
|
|
|
|
slash = if isAbsolute dir then s else ""
|
|
|
|
s = [pathSeparator]
|
|
|
|
|
|
|
|
prop_parentDir_basics :: FilePath -> Bool
|
|
|
|
prop_parentDir_basics dir
|
|
|
|
| null dir = True
|
|
|
|
| dir == "/" = parentDir dir == ""
|
|
|
|
| otherwise = p /= dir
|
|
|
|
where
|
|
|
|
p = parentDir dir
|
|
|
|
|
|
|
|
{- Checks if the first FilePath is, or could be said to contain the second.
|
|
|
|
- For example, "foo/" contains "foo/bar". Also, "foo", "./foo", "foo/" etc
|
|
|
|
- are all equivilant.
|
|
|
|
-}
|
|
|
|
dirContains :: FilePath -> FilePath -> Bool
|
|
|
|
dirContains a b = a == b || a' == b' || (a'++"/") `isPrefixOf` b'
|
|
|
|
where
|
|
|
|
norm p = fromMaybe "" $ absNormPath p "."
|
|
|
|
a' = norm a
|
|
|
|
b' = norm b
|
|
|
|
|
2012-01-23 20:57:45 +00:00
|
|
|
{- Converts a filename into a normalized, absolute path.
|
|
|
|
-
|
|
|
|
- Unlike Directory.canonicalizePath, this does not require the path
|
|
|
|
- already exists. -}
|
2011-08-22 20:14:12 +00:00
|
|
|
absPath :: FilePath -> IO FilePath
|
|
|
|
absPath file = do
|
|
|
|
cwd <- getCurrentDirectory
|
|
|
|
return $ absPathFrom cwd file
|
|
|
|
|
|
|
|
{- Converts a filename into a normalized, absolute path
|
|
|
|
- from the specified cwd. -}
|
|
|
|
absPathFrom :: FilePath -> FilePath -> FilePath
|
|
|
|
absPathFrom cwd file = fromMaybe bad $ absNormPath cwd file
|
|
|
|
where
|
|
|
|
bad = error $ "unable to normalize " ++ file
|
|
|
|
|
|
|
|
{- Constructs a relative path from the CWD to a file.
|
|
|
|
-
|
|
|
|
- For example, assuming CWD is /tmp/foo/bar:
|
|
|
|
- relPathCwdToFile "/tmp/foo" == ".."
|
|
|
|
- relPathCwdToFile "/tmp/foo/bar" == ""
|
|
|
|
-}
|
|
|
|
relPathCwdToFile :: FilePath -> IO FilePath
|
2011-08-25 04:28:55 +00:00
|
|
|
relPathCwdToFile f = relPathDirToFile <$> getCurrentDirectory <*> absPath f
|
2011-08-22 20:14:12 +00:00
|
|
|
|
|
|
|
{- Constructs a relative path from a directory to a file.
|
|
|
|
-
|
|
|
|
- Both must be absolute, and normalized (eg with absNormpath).
|
|
|
|
-}
|
|
|
|
relPathDirToFile :: FilePath -> FilePath -> FilePath
|
2011-10-11 18:43:45 +00:00
|
|
|
relPathDirToFile from to = join s $ dotdots ++ uncommon
|
2011-08-22 20:14:12 +00:00
|
|
|
where
|
|
|
|
s = [pathSeparator]
|
|
|
|
pfrom = split s from
|
|
|
|
pto = split s to
|
2012-03-05 16:42:52 +00:00
|
|
|
common = map fst $ takeWhile same $ zip pfrom pto
|
2011-08-22 20:14:12 +00:00
|
|
|
same (c,d) = c == d
|
|
|
|
uncommon = drop numcommon pto
|
|
|
|
dotdots = replicate (length pfrom - numcommon) ".."
|
|
|
|
numcommon = length common
|
|
|
|
|
|
|
|
prop_relPathDirToFile_basics :: FilePath -> FilePath -> Bool
|
|
|
|
prop_relPathDirToFile_basics from to
|
|
|
|
| from == to = null r
|
|
|
|
| otherwise = not (null r)
|
|
|
|
where
|
|
|
|
r = relPathDirToFile from to
|
2011-09-19 05:37:04 +00:00
|
|
|
|
2012-03-05 16:42:52 +00:00
|
|
|
prop_relPathDirToFile_regressionTest :: Bool
|
|
|
|
prop_relPathDirToFile_regressionTest = same_dir_shortcurcuits_at_difference
|
|
|
|
where
|
|
|
|
{- Two paths have the same directory component at the same
|
|
|
|
- location, but it's not really the same directory.
|
|
|
|
- Code used to get this wrong. -}
|
|
|
|
same_dir_shortcurcuits_at_difference =
|
|
|
|
relPathDirToFile "/tmp/r/lll/xxx/yyy/18" "/tmp/r/.git/annex/objects/18/gk/SHA256-foo/SHA256-foo" == "../../../../.git/annex/objects/18/gk/SHA256-foo/SHA256-foo"
|
|
|
|
|
2011-09-19 05:37:04 +00:00
|
|
|
{- Given an original list of files, and an expanded list derived from it,
|
|
|
|
- ensures that the original list's ordering is preserved.
|
|
|
|
-
|
|
|
|
- The input list may contain a directory, like "dir" or "dir/". Any
|
|
|
|
- items in the expanded list that are contained in that directory will
|
|
|
|
- appear at the same position as it did in the input list.
|
|
|
|
-}
|
|
|
|
preserveOrder :: [FilePath] -> [FilePath] -> [FilePath]
|
2011-10-11 18:43:45 +00:00
|
|
|
preserveOrder [] new = new
|
|
|
|
preserveOrder [_] new = new -- optimisation
|
|
|
|
preserveOrder (l:ls) new = found ++ preserveOrder ls rest
|
2011-09-19 05:37:04 +00:00
|
|
|
where
|
2011-10-11 18:43:45 +00:00
|
|
|
(found, rest)=partition (l `dirContains`) new
|
2011-09-19 05:37:04 +00:00
|
|
|
|
|
|
|
{- Runs an action that takes a list of FilePaths, and ensures that
|
|
|
|
- its return list preserves order.
|
|
|
|
-
|
|
|
|
- This assumes that it's cheaper to call preserveOrder on the result,
|
|
|
|
- than it would be to run the action separately with each param. In the case
|
|
|
|
- of git file list commands, that assumption tends to hold.
|
|
|
|
-}
|
|
|
|
runPreserveOrder :: ([FilePath] -> IO [FilePath]) -> [FilePath] -> IO [FilePath]
|
|
|
|
runPreserveOrder a files = preserveOrder files <$> a files
|
2011-10-16 04:31:25 +00:00
|
|
|
|
|
|
|
{- Current user's home directory. -}
|
|
|
|
myHomeDir :: IO FilePath
|
|
|
|
myHomeDir = homeDirectory <$> (getUserEntryForID =<< getEffectiveUserID)
|
|
|
|
|
|
|
|
{- Checks if a command is available in PATH. -}
|
|
|
|
inPath :: String -> IO Bool
|
|
|
|
inPath command = getSearchPath >>= anyM indir
|
|
|
|
where
|
|
|
|
indir d = doesFileExist $ d </> command
|
2012-01-03 04:09:09 +00:00
|
|
|
|
|
|
|
{- Checks if a filename is a unix dotfile. All files inside dotdirs
|
|
|
|
- count as dotfiles. -}
|
|
|
|
dotfile :: FilePath -> Bool
|
|
|
|
dotfile file
|
|
|
|
| f == "." = False
|
|
|
|
| f == ".." = False
|
|
|
|
| f == "" = False
|
|
|
|
| otherwise = "." `isPrefixOf` f || dotfile (takeDirectory file)
|
|
|
|
where
|
|
|
|
f = takeFileName file
|