|
|
|
|
@@ -12,6 +12,7 @@
|
|
|
|
|
-- Not all functions of "System.FilePath" are implemented yet. Feel free to contribute!
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
{-# LANGUAGE CPP #-}
|
|
|
|
|
{-# LANGUAGE TupleSections #-}
|
|
|
|
|
|
|
|
|
|
{-# OPTIONS_GHC -Wall #-}
|
|
|
|
|
@@ -19,7 +20,7 @@
|
|
|
|
|
|
|
|
|
|
module System.Posix.FilePath (
|
|
|
|
|
|
|
|
|
|
-- * Separators
|
|
|
|
|
-- * Separator predicates
|
|
|
|
|
pathSeparator
|
|
|
|
|
, isPathSeparator
|
|
|
|
|
, searchPathSeparator
|
|
|
|
|
@@ -27,7 +28,11 @@ module System.Posix.FilePath (
|
|
|
|
|
, extSeparator
|
|
|
|
|
, isExtSeparator
|
|
|
|
|
|
|
|
|
|
-- * File extensions
|
|
|
|
|
-- * $PATH methods
|
|
|
|
|
, splitSearchPath
|
|
|
|
|
, getSearchPath
|
|
|
|
|
|
|
|
|
|
-- * Extension functions
|
|
|
|
|
, splitExtension
|
|
|
|
|
, takeExtension
|
|
|
|
|
, replaceExtension
|
|
|
|
|
@@ -38,8 +43,9 @@ module System.Posix.FilePath (
|
|
|
|
|
, splitExtensions
|
|
|
|
|
, dropExtensions
|
|
|
|
|
, takeExtensions
|
|
|
|
|
, stripExtension
|
|
|
|
|
|
|
|
|
|
-- * Filenames/Directory names
|
|
|
|
|
-- * Filename\/directory functions
|
|
|
|
|
, splitFileName
|
|
|
|
|
, takeFileName
|
|
|
|
|
, replaceFileName
|
|
|
|
|
@@ -48,29 +54,27 @@ module System.Posix.FilePath (
|
|
|
|
|
, replaceBaseName
|
|
|
|
|
, takeDirectory
|
|
|
|
|
, replaceDirectory
|
|
|
|
|
|
|
|
|
|
-- * Path combinators and splitters
|
|
|
|
|
, combine
|
|
|
|
|
, (</>)
|
|
|
|
|
, splitPath
|
|
|
|
|
, joinPath
|
|
|
|
|
, splitDirectories
|
|
|
|
|
|
|
|
|
|
-- * Path conversions
|
|
|
|
|
, normalise
|
|
|
|
|
|
|
|
|
|
-- * Trailing path separator
|
|
|
|
|
-- * Trailing slash functions
|
|
|
|
|
, hasTrailingPathSeparator
|
|
|
|
|
, addTrailingPathSeparator
|
|
|
|
|
, dropTrailingPathSeparator
|
|
|
|
|
|
|
|
|
|
-- * Queries
|
|
|
|
|
-- * File name manipulations
|
|
|
|
|
, normalise
|
|
|
|
|
, makeRelative
|
|
|
|
|
, equalFilePath
|
|
|
|
|
, isRelative
|
|
|
|
|
, isAbsolute
|
|
|
|
|
, isValid
|
|
|
|
|
, makeValid
|
|
|
|
|
, isFileName
|
|
|
|
|
, hasParentDir
|
|
|
|
|
, equalFilePath
|
|
|
|
|
, hiddenFile
|
|
|
|
|
|
|
|
|
|
, module System.Posix.ByteString.FilePath
|
|
|
|
|
@@ -78,15 +82,20 @@ module System.Posix.FilePath (
|
|
|
|
|
|
|
|
|
|
import Data.ByteString (ByteString)
|
|
|
|
|
import qualified Data.ByteString as BS
|
|
|
|
|
import Data.String (fromString)
|
|
|
|
|
import System.Posix.ByteString.FilePath
|
|
|
|
|
import qualified System.Posix.Env.ByteString as PE
|
|
|
|
|
|
|
|
|
|
import Data.Maybe (isJust)
|
|
|
|
|
import Data.Word8
|
|
|
|
|
|
|
|
|
|
#if !MIN_VERSION_bytestring(0,10,8)
|
|
|
|
|
import qualified Data.List as L
|
|
|
|
|
#endif
|
|
|
|
|
import Control.Arrow (second)
|
|
|
|
|
|
|
|
|
|
-- $setup
|
|
|
|
|
-- >>> import Data.Char
|
|
|
|
|
-- >>> import Data.Maybe
|
|
|
|
|
-- >>> import Test.QuickCheck
|
|
|
|
|
-- >>> import Control.Applicative
|
|
|
|
|
-- >>> import qualified Data.ByteString as BS
|
|
|
|
|
@@ -96,38 +105,84 @@ import Control.Arrow (second)
|
|
|
|
|
-- >>> let _chr :: Word8 -> Char; _chr = chr . fromIntegral
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- Separator predicates
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Path separator character
|
|
|
|
|
pathSeparator :: Word8
|
|
|
|
|
pathSeparator = _slash
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Check if a character is the path separator
|
|
|
|
|
--
|
|
|
|
|
-- prop> \n -> (_chr n == '/') == isPathSeparator n
|
|
|
|
|
isPathSeparator :: Word8 -> Bool
|
|
|
|
|
isPathSeparator = (== pathSeparator)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Search path separator
|
|
|
|
|
searchPathSeparator :: Word8
|
|
|
|
|
searchPathSeparator = _colon
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Check if a character is the search path separator
|
|
|
|
|
--
|
|
|
|
|
-- prop> \n -> (_chr n == ':') == isSearchPathSeparator n
|
|
|
|
|
isSearchPathSeparator :: Word8 -> Bool
|
|
|
|
|
isSearchPathSeparator = (== searchPathSeparator)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | File extension separator
|
|
|
|
|
extSeparator :: Word8
|
|
|
|
|
extSeparator = _period
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Check if a character is the file extension separator
|
|
|
|
|
--
|
|
|
|
|
-- prop> \n -> (_chr n == '.') == isExtSeparator n
|
|
|
|
|
isExtSeparator :: Word8 -> Bool
|
|
|
|
|
isExtSeparator = (== extSeparator)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- extension stuff
|
|
|
|
|
-- $PATH methods
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Take a ByteString, split it on the 'searchPathSeparator'.
|
|
|
|
|
-- Blank items are converted to @.@.
|
|
|
|
|
--
|
|
|
|
|
-- Follows the recommendations in
|
|
|
|
|
-- <http://www.opengroup.org/onlinepubs/009695399/basedefs/xbd_chap08.html>
|
|
|
|
|
--
|
|
|
|
|
-- >>> splitSearchPath "File1:File2:File3"
|
|
|
|
|
-- ["File1","File2","File3"]
|
|
|
|
|
-- >>> splitSearchPath "File1::File2:File3"
|
|
|
|
|
-- ["File1",".","File2","File3"]
|
|
|
|
|
-- >>> splitSearchPath ""
|
|
|
|
|
-- ["."]
|
|
|
|
|
splitSearchPath :: ByteString -> [RawFilePath]
|
|
|
|
|
splitSearchPath = f
|
|
|
|
|
where
|
|
|
|
|
f bs = let (pre, post) = BS.break isSearchPathSeparator bs
|
|
|
|
|
in if BS.null post
|
|
|
|
|
then g pre
|
|
|
|
|
else g pre ++ f (BS.tail post)
|
|
|
|
|
g x
|
|
|
|
|
| BS.null x = [BS.singleton _period]
|
|
|
|
|
| otherwise = [x]
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Get a list of 'RawFilePath's in the $PATH variable.
|
|
|
|
|
getSearchPath :: IO [RawFilePath]
|
|
|
|
|
getSearchPath = fmap (maybe [] splitSearchPath) (PE.getEnv $ fromString "PATH")
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- Extension functions
|
|
|
|
|
|
|
|
|
|
-- | Split a 'RawFilePath' into a path+filename and extension
|
|
|
|
|
--
|
|
|
|
|
@@ -147,6 +202,7 @@ splitExtension x = if BS.null basename
|
|
|
|
|
(path,file) = splitFileNameRaw x
|
|
|
|
|
(basename,fileExt) = BS.breakEnd isExtSeparator file
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Get the final extension from a 'RawFilePath'
|
|
|
|
|
--
|
|
|
|
|
-- >>> takeExtension "file.exe"
|
|
|
|
|
@@ -158,12 +214,14 @@ splitExtension x = if BS.null basename
|
|
|
|
|
takeExtension :: RawFilePath -> ByteString
|
|
|
|
|
takeExtension = snd . splitExtension
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Change a file's extension
|
|
|
|
|
--
|
|
|
|
|
-- prop> \path -> let ext = takeExtension path in replaceExtension path ext == path
|
|
|
|
|
replaceExtension :: RawFilePath -> ByteString -> RawFilePath
|
|
|
|
|
replaceExtension path ext = dropExtension path <.> ext
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Drop the final extension from a 'RawFilePath'
|
|
|
|
|
--
|
|
|
|
|
-- >>> dropExtension "file.exe"
|
|
|
|
|
@@ -175,6 +233,7 @@ replaceExtension path ext = dropExtension path <.> ext
|
|
|
|
|
dropExtension :: RawFilePath -> RawFilePath
|
|
|
|
|
dropExtension = fst . splitExtension
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Add an extension to a 'RawFilePath'
|
|
|
|
|
--
|
|
|
|
|
-- >>> addExtension "file" ".exe"
|
|
|
|
|
@@ -190,10 +249,6 @@ addExtension file ext
|
|
|
|
|
| otherwise = BS.intercalate (BS.singleton extSeparator) [file, ext]
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Operator version of 'addExtension'
|
|
|
|
|
(<.>) :: RawFilePath -> ByteString -> RawFilePath
|
|
|
|
|
(<.>) = addExtension
|
|
|
|
|
|
|
|
|
|
-- | Check if a 'RawFilePath' has an extension
|
|
|
|
|
--
|
|
|
|
|
-- >>> hasExtension "file"
|
|
|
|
|
@@ -205,7 +260,13 @@ addExtension file ext
|
|
|
|
|
hasExtension :: RawFilePath -> Bool
|
|
|
|
|
hasExtension = isJust . BS.elemIndex extSeparator . takeFileName
|
|
|
|
|
|
|
|
|
|
-- | Split a 'RawFilePath' on the first extension
|
|
|
|
|
|
|
|
|
|
-- | Operator version of 'addExtension'
|
|
|
|
|
(<.>) :: RawFilePath -> ByteString -> RawFilePath
|
|
|
|
|
(<.>) = addExtension
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Split a 'RawFilePath' on the first extension.
|
|
|
|
|
--
|
|
|
|
|
-- >>> splitExtensions "/path/file.tar.gz"
|
|
|
|
|
-- ("/path/file",".tar.gz")
|
|
|
|
|
@@ -219,6 +280,7 @@ splitExtensions x = if BS.null basename
|
|
|
|
|
(path,file) = splitFileNameRaw x
|
|
|
|
|
(basename,fileExt) = BS.break isExtSeparator file
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Remove all extensions from a 'RawFilePath'
|
|
|
|
|
--
|
|
|
|
|
-- >>> dropExtensions "/path/file.tar.gz"
|
|
|
|
|
@@ -226,6 +288,7 @@ splitExtensions x = if BS.null basename
|
|
|
|
|
dropExtensions :: RawFilePath -> RawFilePath
|
|
|
|
|
dropExtensions = fst . splitExtensions
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Take all extensions from a 'RawFilePath'
|
|
|
|
|
--
|
|
|
|
|
-- >>> takeExtensions "/path/file.tar.gz"
|
|
|
|
|
@@ -233,8 +296,48 @@ dropExtensions = fst . splitExtensions
|
|
|
|
|
takeExtensions :: RawFilePath -> ByteString
|
|
|
|
|
takeExtensions = snd . splitExtensions
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Drop the given extension from a FilePath, and the @\".\"@ preceding it.
|
|
|
|
|
-- Returns 'Nothing' if the FilePath does not have the given extension, or
|
|
|
|
|
-- 'Just' and the part before the extension if it does.
|
|
|
|
|
--
|
|
|
|
|
-- This function can be more predictable than 'dropExtensions',
|
|
|
|
|
-- especially if the filename might itself contain @.@ characters.
|
|
|
|
|
--
|
|
|
|
|
-- >>> stripExtension "hs.o" "foo.x.hs.o"
|
|
|
|
|
-- Just "foo.x"
|
|
|
|
|
-- >>> stripExtension "hi.o" "foo.x.hs.o"
|
|
|
|
|
-- Nothing
|
|
|
|
|
-- >>> stripExtension ".c.d" "a.b.c.d"
|
|
|
|
|
-- Just "a.b"
|
|
|
|
|
-- >>> stripExtension ".c.d" "a.b..c.d"
|
|
|
|
|
-- Just "a.b."
|
|
|
|
|
-- >>> stripExtension "baz" "foo.bar"
|
|
|
|
|
-- Nothing
|
|
|
|
|
-- >>> stripExtension "bar" "foobar"
|
|
|
|
|
-- Nothing
|
|
|
|
|
--
|
|
|
|
|
-- prop> \path -> stripExtension "" path == Just path
|
|
|
|
|
-- prop> \path -> dropExtension path == fromJust (stripExtension (takeExtension path) path)
|
|
|
|
|
-- prop> \path -> dropExtensions path == fromJust (stripExtension (takeExtensions path) path)
|
|
|
|
|
stripExtension :: ByteString -> RawFilePath -> Maybe RawFilePath
|
|
|
|
|
stripExtension bs path
|
|
|
|
|
| BS.null bs = Just path
|
|
|
|
|
| otherwise = stripSuffix' dotExt path
|
|
|
|
|
where
|
|
|
|
|
dotExt = if isExtSeparator $ BS.head bs
|
|
|
|
|
then bs
|
|
|
|
|
else extSeparator `BS.cons` bs
|
|
|
|
|
#if MIN_VERSION_bytestring(0,10,8)
|
|
|
|
|
stripSuffix' = BS.stripSuffix
|
|
|
|
|
#else
|
|
|
|
|
stripSuffix' xs ys = fmap (BS.pack . reverse) $ L.stripPrefix (reverse $ BS.unpack xs) (reverse $ BS.unpack ys)
|
|
|
|
|
#endif
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- more stuff
|
|
|
|
|
-- Filename/directory functions
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Split a 'RawFilePath' into (path,file). 'combine' is the inverse
|
|
|
|
|
--
|
|
|
|
|
@@ -264,12 +367,14 @@ splitFileName x = if BS.null path
|
|
|
|
|
takeFileName :: RawFilePath -> RawFilePath
|
|
|
|
|
takeFileName = snd . splitFileName
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Change the file name
|
|
|
|
|
--
|
|
|
|
|
-- prop> \path -> replaceFileName path (takeFileName path) == path
|
|
|
|
|
replaceFileName :: RawFilePath -> ByteString -> RawFilePath
|
|
|
|
|
replaceFileName x y = fst (splitFileNameRaw x) </> y
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Drop the file name
|
|
|
|
|
--
|
|
|
|
|
-- >>> dropFileName "path/file.txt"
|
|
|
|
|
@@ -279,6 +384,7 @@ replaceFileName x y = fst (splitFileNameRaw x) </> y
|
|
|
|
|
dropFileName :: RawFilePath -> RawFilePath
|
|
|
|
|
dropFileName = fst . splitFileName
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Get the file name, without a trailing extension
|
|
|
|
|
--
|
|
|
|
|
-- >>> takeBaseName "path/file.tar.gz"
|
|
|
|
|
@@ -288,6 +394,7 @@ dropFileName = fst . splitFileName
|
|
|
|
|
takeBaseName :: RawFilePath -> ByteString
|
|
|
|
|
takeBaseName = dropExtension . takeFileName
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Change the base name
|
|
|
|
|
--
|
|
|
|
|
-- >>> replaceBaseName "path/file.tar.gz" "bob"
|
|
|
|
|
@@ -300,6 +407,7 @@ replaceBaseName path name = combineRaw dir (name <.> ext)
|
|
|
|
|
(dir,file) = splitFileNameRaw path
|
|
|
|
|
ext = takeExtension file
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Get the directory, moving up one level if it's already a directory
|
|
|
|
|
--
|
|
|
|
|
-- >>> takeDirectory "path/file.txt"
|
|
|
|
|
@@ -319,12 +427,14 @@ takeDirectory x = case () of
|
|
|
|
|
res = fst $ BS.spanEnd isPathSeparator file
|
|
|
|
|
file = dropFileName x
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Change the directory component of a 'RawFilePath'
|
|
|
|
|
--
|
|
|
|
|
-- prop> \path -> replaceDirectory path (takeDirectory path) `equalFilePath` path || takeDirectory path == "."
|
|
|
|
|
replaceDirectory :: RawFilePath -> ByteString -> RawFilePath
|
|
|
|
|
replaceDirectory file dir = combineRaw dir (takeFileName file)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Join two paths together
|
|
|
|
|
--
|
|
|
|
|
-- >>> combine "/" "file"
|
|
|
|
|
@@ -337,6 +447,7 @@ combine :: RawFilePath -> RawFilePath -> RawFilePath
|
|
|
|
|
combine a b | not (BS.null b) && isPathSeparator (BS.head b) = b
|
|
|
|
|
| otherwise = combineRaw a b
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Operator version of combine
|
|
|
|
|
(</>) :: RawFilePath -> RawFilePath -> RawFilePath
|
|
|
|
|
(</>) = combine
|
|
|
|
|
@@ -358,6 +469,17 @@ splitPath = splitter
|
|
|
|
|
Nothing -> [x]
|
|
|
|
|
Just runlen -> uncurry (:) . second splitter $ BS.splitAt (ix+1+runlen) x
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Join a split path back together
|
|
|
|
|
--
|
|
|
|
|
-- prop> \path -> joinPath (splitPath path) == path
|
|
|
|
|
--
|
|
|
|
|
-- >>> joinPath ["path","to","file.txt"]
|
|
|
|
|
-- "path/to/file.txt"
|
|
|
|
|
joinPath :: [RawFilePath] -> RawFilePath
|
|
|
|
|
joinPath = foldr (</>) BS.empty
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Like 'splitPath', but without trailing slashes
|
|
|
|
|
--
|
|
|
|
|
-- >>> splitDirectories "/path/to/file.txt"
|
|
|
|
|
@@ -373,14 +495,60 @@ splitDirectories x
|
|
|
|
|
where
|
|
|
|
|
splitter = filter (not . BS.null) . BS.split pathSeparator
|
|
|
|
|
|
|
|
|
|
-- | Join a split path back together
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- Trailing slash functions
|
|
|
|
|
|
|
|
|
|
-- | Check if the last character of a 'RawFilePath' is '/'.
|
|
|
|
|
--
|
|
|
|
|
-- prop> \path -> joinPath (splitPath path) == path
|
|
|
|
|
-- >>> hasTrailingPathSeparator "/path/"
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> hasTrailingPathSeparator "/"
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> hasTrailingPathSeparator "/path"
|
|
|
|
|
-- False
|
|
|
|
|
hasTrailingPathSeparator :: RawFilePath -> Bool
|
|
|
|
|
hasTrailingPathSeparator x
|
|
|
|
|
| BS.null x = False
|
|
|
|
|
| otherwise = isPathSeparator $ BS.last x
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Add a trailing path separator.
|
|
|
|
|
--
|
|
|
|
|
-- >>> joinPath ["path","to","file.txt"]
|
|
|
|
|
-- "path/to/file.txt"
|
|
|
|
|
joinPath :: [RawFilePath] -> RawFilePath
|
|
|
|
|
joinPath = foldr (</>) BS.empty
|
|
|
|
|
-- >>> addTrailingPathSeparator "/path"
|
|
|
|
|
-- "/path/"
|
|
|
|
|
-- >>> addTrailingPathSeparator "/path/"
|
|
|
|
|
-- "/path/"
|
|
|
|
|
-- >>> addTrailingPathSeparator "/"
|
|
|
|
|
-- "/"
|
|
|
|
|
addTrailingPathSeparator :: RawFilePath -> RawFilePath
|
|
|
|
|
addTrailingPathSeparator x = if hasTrailingPathSeparator x
|
|
|
|
|
then x
|
|
|
|
|
else x `BS.snoc` pathSeparator
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Remove a trailing path separator
|
|
|
|
|
--
|
|
|
|
|
-- >>> dropTrailingPathSeparator "/path/"
|
|
|
|
|
-- "/path"
|
|
|
|
|
-- >>> dropTrailingPathSeparator "/path////"
|
|
|
|
|
-- "/path"
|
|
|
|
|
-- >>> dropTrailingPathSeparator "/"
|
|
|
|
|
-- "/"
|
|
|
|
|
-- >>> dropTrailingPathSeparator "//"
|
|
|
|
|
-- "/"
|
|
|
|
|
dropTrailingPathSeparator :: RawFilePath -> RawFilePath
|
|
|
|
|
dropTrailingPathSeparator x
|
|
|
|
|
| x == BS.singleton pathSeparator = x
|
|
|
|
|
| otherwise = if hasTrailingPathSeparator x
|
|
|
|
|
then dropTrailingPathSeparator $ BS.init x
|
|
|
|
|
else x
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- File name manipulations
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- |Normalise a file.
|
|
|
|
|
@@ -436,54 +604,80 @@ normalise filepath =
|
|
|
|
|
dropDots :: [ByteString] -> [ByteString]
|
|
|
|
|
dropDots = filter (BS.singleton _period /=)
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- trailing path separators
|
|
|
|
|
|
|
|
|
|
-- | Check if the last character of a 'RawFilePath' is '/'.
|
|
|
|
|
|
|
|
|
|
-- | Contract a filename, based on a relative path. Note that the resulting
|
|
|
|
|
-- path will never introduce @..@ paths, as the presence of symlinks
|
|
|
|
|
-- means @..\/b@ may not reach @a\/b@ if it starts from @a\/c@. For a
|
|
|
|
|
-- worked example see
|
|
|
|
|
-- <http://neilmitchell.blogspot.co.uk/2015/10/filepaths-are-subtle-symlinks-are-hard.html this blog post>.
|
|
|
|
|
--
|
|
|
|
|
-- >>> hasTrailingPathSeparator "/path/"
|
|
|
|
|
-- >>> makeRelative "/directory" "/directory/file.ext"
|
|
|
|
|
-- "file.ext"
|
|
|
|
|
-- >>> makeRelative "/Home" "/home/bob"
|
|
|
|
|
-- "/home/bob"
|
|
|
|
|
-- >>> makeRelative "/home/" "/home/bob/foo/bar"
|
|
|
|
|
-- "bob/foo/bar"
|
|
|
|
|
-- >>> makeRelative "/fred" "bob"
|
|
|
|
|
-- "bob"
|
|
|
|
|
-- >>> makeRelative "/file/test" "/file/test/fred"
|
|
|
|
|
-- "fred"
|
|
|
|
|
-- >>> makeRelative "/file/test" "/file/test/fred/"
|
|
|
|
|
-- "fred/"
|
|
|
|
|
-- >>> makeRelative "some/path" "some/path/a/b/c"
|
|
|
|
|
-- "a/b/c"
|
|
|
|
|
--
|
|
|
|
|
-- prop> \p -> makeRelative p p == "."
|
|
|
|
|
-- prop> \p -> makeRelative (takeDirectory p) p `equalFilePath` takeFileName p
|
|
|
|
|
-- prop \x y -> equalFilePath x y || (isRelative x && makeRelative y x == x) || equalFilePath (y </> makeRelative y x) x
|
|
|
|
|
makeRelative :: RawFilePath -> RawFilePath -> RawFilePath
|
|
|
|
|
makeRelative root path
|
|
|
|
|
| equalFilePath root path = BS.singleton _period
|
|
|
|
|
| takeAbs root /= takeAbs path = path
|
|
|
|
|
| otherwise = f (dropAbs root) (dropAbs path)
|
|
|
|
|
where
|
|
|
|
|
f x y
|
|
|
|
|
| BS.null x = BS.dropWhile isPathSeparator y
|
|
|
|
|
| otherwise = let (x1,x2) = g x
|
|
|
|
|
(y1,y2) = g y
|
|
|
|
|
in if equalFilePath x1 y1 then f x2 y2 else path
|
|
|
|
|
g x = (BS.dropWhile isPathSeparator a, BS.dropWhile isPathSeparator b)
|
|
|
|
|
where (a, b) = BS.break isPathSeparator $ BS.dropWhile isPathSeparator x
|
|
|
|
|
dropAbs x = snd $ BS.span (== _slash) x
|
|
|
|
|
takeAbs x = fst $ BS.span (== _slash) x
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- |Equality of two filepaths. The filepaths are normalised
|
|
|
|
|
-- and trailing path separators are dropped.
|
|
|
|
|
--
|
|
|
|
|
-- >>> equalFilePath "foo" "foo"
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> hasTrailingPathSeparator "/"
|
|
|
|
|
-- >>> equalFilePath "foo" "foo/"
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> hasTrailingPathSeparator "/path"
|
|
|
|
|
-- >>> equalFilePath "foo" "./foo"
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> equalFilePath "" ""
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> equalFilePath "foo" "/foo"
|
|
|
|
|
-- False
|
|
|
|
|
-- >>> equalFilePath "foo" "FOO"
|
|
|
|
|
-- False
|
|
|
|
|
-- >>> equalFilePath "foo" "../foo"
|
|
|
|
|
-- False
|
|
|
|
|
hasTrailingPathSeparator :: RawFilePath -> Bool
|
|
|
|
|
hasTrailingPathSeparator x
|
|
|
|
|
| BS.null x = False
|
|
|
|
|
| otherwise = isPathSeparator $ BS.last x
|
|
|
|
|
|
|
|
|
|
-- | Add a trailing path separator.
|
|
|
|
|
--
|
|
|
|
|
-- >>> addTrailingPathSeparator "/path"
|
|
|
|
|
-- "/path/"
|
|
|
|
|
-- >>> addTrailingPathSeparator "/path/"
|
|
|
|
|
-- "/path/"
|
|
|
|
|
-- >>> addTrailingPathSeparator "/"
|
|
|
|
|
-- "/"
|
|
|
|
|
addTrailingPathSeparator :: RawFilePath -> RawFilePath
|
|
|
|
|
addTrailingPathSeparator x = if hasTrailingPathSeparator x
|
|
|
|
|
then x
|
|
|
|
|
else x `BS.snoc` pathSeparator
|
|
|
|
|
-- prop> \p -> equalFilePath p p
|
|
|
|
|
equalFilePath :: RawFilePath -> RawFilePath -> Bool
|
|
|
|
|
equalFilePath p1 p2 = f p1 == f p2
|
|
|
|
|
where
|
|
|
|
|
f x = dropTrailingPathSeparator $ normalise x
|
|
|
|
|
|
|
|
|
|
-- | Remove a trailing path separator
|
|
|
|
|
|
|
|
|
|
-- | Check if a path is relative
|
|
|
|
|
--
|
|
|
|
|
-- >>> dropTrailingPathSeparator "/path/"
|
|
|
|
|
-- "/path"
|
|
|
|
|
-- >>> dropTrailingPathSeparator "/path////"
|
|
|
|
|
-- "/path"
|
|
|
|
|
-- >>> dropTrailingPathSeparator "/"
|
|
|
|
|
-- "/"
|
|
|
|
|
-- >>> dropTrailingPathSeparator "//"
|
|
|
|
|
-- "/"
|
|
|
|
|
dropTrailingPathSeparator :: RawFilePath -> RawFilePath
|
|
|
|
|
dropTrailingPathSeparator x
|
|
|
|
|
| x == BS.singleton pathSeparator = x
|
|
|
|
|
| otherwise = if hasTrailingPathSeparator x
|
|
|
|
|
then dropTrailingPathSeparator $ BS.init x
|
|
|
|
|
else x
|
|
|
|
|
-- prop> \path -> isRelative path /= isAbsolute path
|
|
|
|
|
isRelative :: RawFilePath -> Bool
|
|
|
|
|
isRelative = not . isAbsolute
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- Filename/system stuff
|
|
|
|
|
|
|
|
|
|
-- | Check if a path is absolute
|
|
|
|
|
--
|
|
|
|
|
@@ -498,11 +692,6 @@ isAbsolute x
|
|
|
|
|
| BS.length x > 0 = isPathSeparator (BS.head x)
|
|
|
|
|
| otherwise = False
|
|
|
|
|
|
|
|
|
|
-- | Check if a path is relative
|
|
|
|
|
--
|
|
|
|
|
-- prop> \path -> isRelative path /= isAbsolute path
|
|
|
|
|
isRelative :: RawFilePath -> Bool
|
|
|
|
|
isRelative = not . isAbsolute
|
|
|
|
|
|
|
|
|
|
-- | Is a FilePath valid, i.e. could you create a file like it?
|
|
|
|
|
--
|
|
|
|
|
@@ -518,6 +707,22 @@ isValid filepath
|
|
|
|
|
| _nul `BS.elem` filepath = False
|
|
|
|
|
| otherwise = True
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Take a FilePath and make it valid; does not change already valid FilePaths.
|
|
|
|
|
--
|
|
|
|
|
-- >>> makeValid ""
|
|
|
|
|
-- "_"
|
|
|
|
|
-- >>> makeValid "file\0name"
|
|
|
|
|
-- "file_name"
|
|
|
|
|
--
|
|
|
|
|
-- prop> \p -> if isValid p then makeValid p == p else makeValid p /= p
|
|
|
|
|
-- prop> \p -> isValid (makeValid p)
|
|
|
|
|
makeValid :: RawFilePath -> RawFilePath
|
|
|
|
|
makeValid path
|
|
|
|
|
| BS.null path = BS.singleton _underscore
|
|
|
|
|
| otherwise = BS.map (\x -> if x == _nul then _underscore else x) path
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Is the given path a valid filename? This includes
|
|
|
|
|
-- "." and "..".
|
|
|
|
|
--
|
|
|
|
|
@@ -539,6 +744,7 @@ isFileName filepath =
|
|
|
|
|
not (BS.null filepath) &&
|
|
|
|
|
not (_nul `BS.elem` filepath)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Check if the filepath has any parent directories in it.
|
|
|
|
|
--
|
|
|
|
|
-- >>> hasParentDir "/.."
|
|
|
|
|
@@ -570,28 +776,6 @@ hasParentDir filepath =
|
|
|
|
|
where
|
|
|
|
|
pathDoubleDot = BS.pack [_period, _period]
|
|
|
|
|
|
|
|
|
|
-- |Equality of two filepaths. The filepaths are normalised
|
|
|
|
|
-- and trailing path separators are dropped.
|
|
|
|
|
--
|
|
|
|
|
-- >>> equalFilePath "foo" "foo"
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> equalFilePath "foo" "foo/"
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> equalFilePath "foo" "./foo"
|
|
|
|
|
-- True
|
|
|
|
|
-- >>> equalFilePath "foo" "/foo"
|
|
|
|
|
-- False
|
|
|
|
|
-- >>> equalFilePath "foo" "FOO"
|
|
|
|
|
-- False
|
|
|
|
|
-- >>> equalFilePath "foo" "../foo"
|
|
|
|
|
-- False
|
|
|
|
|
--
|
|
|
|
|
-- prop> \p -> equalFilePath p p
|
|
|
|
|
equalFilePath :: RawFilePath -> RawFilePath -> Bool
|
|
|
|
|
equalFilePath p1 p2 = f p1 == f p2
|
|
|
|
|
where
|
|
|
|
|
f x = dropTrailingPathSeparator $ normalise x
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
-- | Whether the file is a hidden file.
|
|
|
|
|
--
|
|
|
|
|
@@ -620,6 +804,8 @@ hiddenFile fp
|
|
|
|
|
where
|
|
|
|
|
fn = takeFileName fp
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
------------------------
|
|
|
|
|
-- internal stuff
|
|
|
|
|
|
|
|
|
|
|