-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathSubUtils.hs
83 lines (66 loc) · 2.53 KB
/
SubUtils.hs
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
module SubUtils where
import System.Environment
import System.Directory
import Control.Monad
import Data.List
glob :: String -> IO [String]
glob path
| not $ '*' `elem` path = return [path]
| head path == '/' = globalGlob path
| otherwise = localGlob path
localGlob :: String -> IO [String]
localGlob path = do
pwd <- getCurrentDirectory
globalGlob (pwd ++ "/" ++ path)
globalGlob :: String -> IO [String]
globalGlob path = let list = tail . splitSlash $ path in foldM (flip stepGlob) ["/"] list
stepGlob :: String -> [String] -> IO [String]
stepGlob pattern state = fmap concat $ mapM (flip expandStar pattern) state
expandStar :: String -> String -> IO [String]
expandStar dir pattern = do
isDir <- doesDirectoryExist dir
if isDir then do
options <- listDirectory dir
let valid = filter (starMatch pattern) options
let dir' = if last dir == '/' then dir else dir ++ "/"
return [ dir' ++ option | option <- valid ]
else do
return []
starMatch :: String -> String -> Bool
starMatch ('*':_) ('.':_) = False --prevents matching hidden files with * .* however would work
starMatch xs ys = simpleMatch xs ys
simpleMatch :: String -> String -> Bool
simpleMatch ('*':xs) (y:ys) = starMatch xs (y:ys) || starMatch ('*':xs) ys
simpleMatch (x:xs) (y:ys) = (x == y) && (starMatch xs ys)
simpleMatch [] [] = True
simpleMatch "*" [] = True
simpleMatch _ _ = False
deTildify :: String -> IO String
deTildify s = do
home <- getEnv "HOME"
return $ sub "~" home s
tildify :: String -> IO String
tildify s = do
home <- getEnv "HOME"
return $ sub home "~" s
sub :: String -> String -> String -> String
sub _ _ [] = []
sub match replace input = if isPrefix match input then replace ++ (sub match replace (drop (length match) input)) else (head input) : (sub match replace (tail input))
doSubs :: [(String,String)] -> String -> String
doSubs subs w = simpleDoSubs (reverse . sortOn (length . fst) $ subs) w
-- applying subs from longest to shortest prevents things like (x,hi) (xs,bye) from truning x xs into hi his
simpleDoSubs :: [(String,String)] -> String -> String
simpleDoSubs [] s = s
simpleDoSubs ((m,r):xs) s = simpleDoSubs xs (sub m r s)
splitPath,splitSlash :: String -> [String]
splitPath = splitOn ':'
splitSlash = splitOn '/'
splitOn :: Char -> String -> [String]
splitOn _ "" = []
splitOn c s = let (x,xs) = break (== c) s in case xs of
"" -> [x]
w -> x: (splitOn c . tail $ w)
isPrefix :: (Eq a) => [a] -> [a] -> Bool
isPrefix (x:xs) (y:ys) = (x == y) && isPrefix xs ys
isPrefix [] _ = True
isPrefix _ [] = False