summaryrefslogtreecommitdiff
path: root/lib/Paths.hs
blob: 83c065f962d1682a16c1c6d4fcce54fbc9d4d752 (plain)
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
{-# LANGUAGE MultiWayIf        #-}
{-# LANGUAGE OverloadedStrings #-}

-- | Paths are horrible, so they have their own module now.
-- I just hope you are running this on some kind of Unix
module Paths where

import           Data.Text             (Text, isPrefixOf)
import qualified Data.Text             as T
import           System.FilePath       (splitPath)
import           System.FilePath.Posix ((</>))
import           Text.Regex.TDFA
import           Util                  (PrettyPrint (prettyprint))

-- | a normalised path: a number of "upwards" steps, and
-- a path without any . or .. in it. Also possibly a
-- fragment, mostly for map links.
data RelPath = Path Int Text (Maybe Text)
  deriving (Show, Eq, Ord)



data PathResult = OkRelPath RelPath | AbsolutePath | NotAPath | UnderscoreMapLink | AtMapLink

-- | horrible regex parsing for filepaths that is hopefully kinda safe
parsePath :: Text -> PathResult
parsePath text =
  if | rest =~ ("^([^/]*[^\\./]/)*[^/]*[^\\./]$" :: Text) -> OkRelPath (Path up path fragment)
     | "/_/" `isPrefixOf` text ->  UnderscoreMapLink
     | "/@/" `isPrefixOf` text ->  AtMapLink
     | "/" `isPrefixOf` text ->  AbsolutePath
     | otherwise ->  NotAPath
  where
    (_, prefix, rest, _) =
      text =~ ("^((\\.|\\.\\.)/)*" :: Text) :: (Text, Text, Text, [Text])
    -- how many steps upwards in the tree?
    up = length . filter (".." ==) . T.splitOn  "/" $ prefix
    parts = T.splitOn "#" rest
    path = head parts
    fragment = if length parts >= 2
      then Just $ T.concat $ tail parts -- TODO!
      else Nothing

instance PrettyPrint RelPath where
  prettyprint (Path up rest frag) = ups <> rest <> fragment
    where ups = T.concat $ replicate up "../"
          fragment = maybe mempty ("#" <>) frag

-- | Normalises a path.
--
-- It takes a `prefix`, and will "truncate" the .. operator
-- at the end of the prefix, i.e. it will never return paths
-- that lie (naïvely) outside of the prefix.
normalise :: FilePath -> RelPath ->  FilePath
normalise prefix (Path 0 path _) = prefix </> T.unpack path
normalise prefix (Path i path _) =
  concat (take (length dirs - i) dirs) </> T.unpack path
  where dirs = splitPath prefix

normaliseWithFrag :: FilePath -> RelPath -> FilePath
normaliseWithFrag prefix (Path i path frag) =
  normalise prefix (Path (i+1) path frag) <> T.unpack (maybe mempty ("#" <>) frag)

-- | does this path contain an old-style pattern for inter-repository
-- links as was used at rc3 in 2020?
isOldStyle :: RelPath -> Bool
isOldStyle (Path _ text frag) = path =~ ("{<.+>*}" :: Text)
  where path = case frag of
          Just f -> text <> f
          _ -> text

getExtension :: RelPath -> Text
getExtension (Path _ text frag) = case length splitted of
  0 -> ""
  _ -> last splitted
  where splitted = T.splitOn "." text