|
@@ -1,18 +1,18 @@
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
|
|
-module Collage.Commands.Splice (runSplice, findFragments) where
|
|
+module Collage.Commands.Splice(runSplice) where
|
|
|
|
|
|
import Control.Monad (foldM)
|
|
import Control.Monad (foldM)
|
|
import qualified Data.Map as M
|
|
import qualified Data.Map as M
|
|
import qualified Data.Text as T
|
|
import qualified Data.Text as T
|
|
import qualified Data.Text.Lazy as TL
|
|
import qualified Data.Text.Lazy as TL
|
|
import qualified Data.Text.Lazy.IO as TL
|
|
import qualified Data.Text.Lazy.IO as TL
|
|
-import qualified System.Exit as Sys
|
|
|
|
import System.FilePath ((</>))
|
|
import System.FilePath ((</>))
|
|
import qualified System.FilePath as Sys
|
|
import qualified System.FilePath as Sys
|
|
|
|
|
|
import Collage.Config
|
|
import Collage.Config
|
|
import Collage.Opts
|
|
import Collage.Opts
|
|
|
|
+import Collage.Utils
|
|
|
|
|
|
findFragmentIdentifiers :: TL.Text -> [T.Text]
|
|
findFragmentIdentifiers :: TL.Text -> [T.Text]
|
|
findFragmentIdentifiers t
|
|
findFragmentIdentifiers t
|
|
@@ -21,64 +21,51 @@ findFragmentIdentifiers t
|
|
, not (TL.null f) = TL.toStrict f : findFragmentIdentifiers rs'
|
|
, not (TL.null f) = TL.toStrict f : findFragmentIdentifiers rs'
|
|
| otherwise = []
|
|
| otherwise = []
|
|
|
|
|
|
|
|
+newtype Fragment = Fragment [T.Text] deriving (Eq, Show)
|
|
|
|
+
|
|
toIdent :: T.Text -> TL.Text
|
|
toIdent :: T.Text -> TL.Text
|
|
toIdent = TL.fromStrict . T.cons '«' . flip T.snoc '»'
|
|
toIdent = TL.fromStrict . T.cons '«' . flip T.snoc '»'
|
|
|
|
|
|
-findFragments :: FilePath -> T.Text -> [Source] -> Either String (IO TL.Text)
|
|
+findFragments :: FilePath -> T.Text -> [Source] -> Either TL.Text (IO TL.Text)
|
|
findFragments root s sources = case (T.splitOn "/" s) of
|
|
findFragments root s sources = case (T.splitOn "/" s) of
|
|
- [] -> error "(should not happen)"
|
|
+ [] -> throw "Invalid empty fragment name!"
|
|
(x:rs) -> case [ src
|
|
(x:rs) -> case [ src
|
|
| src@Source { sourceName = n } <- sources
|
|
| src@Source { sourceName = n } <- sources
|
|
, n == x
|
|
, n == x
|
|
] of
|
|
] of
|
|
[src] -> go src rs (sourceExpose src)
|
|
[src] -> go src rs (sourceExpose src)
|
|
- [] -> Left ("Unable to find source named " ++ T.unpack x)
|
|
+ [] -> throw ("Unable to find source named " % stext) x
|
|
- _ -> Left ("Ambiguous source name: " ++ T.unpack x)
|
|
+ _ -> throw ("Ambiguous source name: " % stext) x
|
|
where
|
|
where
|
|
- go :: Source -> [T.Text] -> Expose -> Either String (IO TL.Text)
|
|
+
|
|
go q [] (ExposeFile path) =
|
|
go q [] (ExposeFile path) =
|
|
return (TL.readFile (root </> sourceDir q </> path))
|
|
return (TL.readFile (root </> sourceDir q </> path))
|
|
go _ [] ExposeSections{} =
|
|
go _ [] ExposeSections{} =
|
|
- Left $ concat [ "Splice identifier «"
|
|
+ throw ("Splice identifier «" % stext %
|
|
- , T.unpack s
|
|
+ "» matches a file with sections") s
|
|
- , "» matches a file with sections, but "
|
|
|
|
- , "does not specify a section!"
|
|
|
|
- ]
|
|
|
|
go _ [] NamedMap{} =
|
|
go _ [] NamedMap{} =
|
|
- Left $ concat [ "Splice identifier «"
|
|
+ throw ("Splice identifier «" % stext %
|
|
- , T.unpack s
|
|
+ "» matches a map, but does not specify a key!") s
|
|
- , "» matches a map, but does not specify "
|
|
|
|
- , "a key!"
|
|
|
|
- ]
|
|
|
|
|
|
|
|
go q [section] (ExposeSections path) =
|
|
go q [section] (ExposeSections path) =
|
|
return (readSection (root </> sourceDir q </> path) section)
|
|
return (readSection (root </> sourceDir q </> path) section)
|
|
|
|
|
|
go _ (_:_) (ExposeSections path) =
|
|
go _ (_:_) (ExposeSections path) =
|
|
- Left $ concat [ "Splice identifier «"
|
|
+ throw ("Splice identifier «" % stext %
|
|
- , T.unpack s
|
|
+ "» indexes too far into the path " % string % "!")
|
|
- , "» indexes too far into the path "
|
|
+ s path
|
|
- , path
|
|
|
|
- , "!"
|
|
|
|
- ]
|
|
|
|
|
|
|
|
go _ (_:_) (ExposeFile path) =
|
|
go _ (_:_) (ExposeFile path) =
|
|
- Left $ concat [ "Splice identifier «"
|
|
+ throw ("Splice identifier «" % stext %
|
|
- , T.unpack s
|
|
+ "» indexes too far into the file " % string % "!")
|
|
- , "» indexes too far into the file "
|
|
+ s path
|
|
- , path
|
|
|
|
- , "!"
|
|
|
|
- ]
|
|
|
|
|
|
|
|
go q (k:rs) (NamedMap m)
|
|
go q (k:rs) (NamedMap m)
|
|
| Just e <- M.lookup k m = go q rs e
|
|
| Just e <- M.lookup k m = go q rs e
|
|
- | otherwise = Left $ concat
|
|
+ | otherwise = throw
|
|
- [ "Splice identifier «"
|
|
+ ("Splice identifier «" % stext %
|
|
- , T.unpack s
|
|
+ "» references a key " % stext %
|
|
- , "» references a key "
|
|
+ " which cannot be found.") s k
|
|
- , T.unpack k
|
|
|
|
- , " which cannot be found."
|
|
|
|
- ]
|
|
|
|
|
|
|
|
doReplacements :: FilePath -> [Source] -> TL.Text -> IO TL.Text
|
|
doReplacements :: FilePath -> [Source] -> TL.Text -> IO TL.Text
|
|
doReplacements root e original =
|
|
doReplacements root e original =
|
|
@@ -86,7 +73,7 @@ doReplacements root e original =
|
|
where
|
|
where
|
|
doReplace file frag = do
|
|
doReplace file frag = do
|
|
new <- case findFragments root frag e of
|
|
new <- case findFragments root frag e of
|
|
- Left err -> Sys.die err
|
|
+ Left err -> cError err
|
|
Right x -> x
|
|
Right x -> x
|
|
return (TL.replace (toIdent frag) new file)
|
|
return (TL.replace (toIdent frag) new file)
|
|
|
|
|
|
@@ -94,11 +81,8 @@ readSection :: FilePath -> T.Text -> IO TL.Text
|
|
readSection path f = do
|
|
readSection path f = do
|
|
contents <- TL.readFile path
|
|
contents <- TL.readFile path
|
|
case TL.breakOn (toIdent f) contents of
|
|
case TL.breakOn (toIdent f) contents of
|
|
- (_, "") -> Sys.die $ unwords [ "Unable to find section"
|
|
+ (_, "") -> cError (format ("Unable to find section " % shown %
|
|
- , show f
|
|
+ " in file " % string) f path)
|
|
- , "in file"
|
|
|
|
- , path
|
|
|
|
- ]
|
|
|
|
(_, rs) ->
|
|
(_, rs) ->
|
|
let (_, skipLine) = TL.breakOn "\n" rs
|
|
let (_, skipLine) = TL.breakOn "\n" rs
|
|
(section, _) = TL.breakOn "«end»" (TL.drop 1 skipLine)
|
|
(section, _) = TL.breakOn "«end»" (TL.drop 1 skipLine)
|