module Data.Text.ParagraphLayoutSpec (spec) where
import Test.Hspec
import Test.Hspec.Golden
import System.FilePath ((</>))
import Data.Text.ParagraphLayout
import Data.Text.ParagraphLayout.FontLoader
import Data.Text.ParagraphLayout.ParagraphData
import Data.Text.ParagraphLayout.Rect
class PrettyShow a where
prettyShow :: a -> String
instance PrettyShow ParagraphLayout where
prettyShow (ParagraphLayout pr sls) = concat
[ "ParagraphLayout {paragraphRect = "
, show pr
, commaSpace
, "spanLayouts = ["
, newline
, indent1
, concat $ indentedList indent1 $ map prettyShow sls
, newline
, "]}"
, newline
]
instance PrettyShow SpanLayout where
prettyShow (SpanLayout frags) = concat
[ "SpanLayout ["
, concat $ inlineList $ map prettyShow frags
, "]"
]
instance PrettyShow Fragment where
prettyShow (Fragment r pen glyphs) = concat
[ "Fragment {fragmentRect = "
, show r
, commaSpace
, "fragmentPen = "
, show pen
, commaSpace
, "fragmentGlyphs ="
, newline
, indent2
, "["
, concat $ indentedList indent2 $ map show glyphs
, "]"
, newline
, indent1
, "}"
]
inlineList :: [String] -> [String]
inlineList items = suffixInit commaSpace items
indentedList :: String -> [String] -> [String]
indentedList indent items = prefixTail indent $ suffixInit commaNewline items
suffixInit :: String -> [String] -> [String]
suffixInit suffix = mapInit (++suffix)
mapInit :: (a -> a) -> [a] -> [a]
mapInit _ [] = []
mapInit _ [x] = [x]
mapInit f (x:y:ys) = f x : mapInit f (y:ys)
prefixTail :: String -> [String] -> [String]
prefixTail prefix = mapTail (prefix++)
mapTail :: (a -> a) -> [a] -> [a]
mapTail _ [] = []
mapTail f (x:xs) = x:(map f xs)
indent1 :: String
indent1 = " "
indent2 :: String
indent2 = indent1 ++ indent1
newline :: String
newline = "\n"
commaSpace :: String
commaSpace = ", "
commaNewline :: String
commaNewline = "," ++ newline
class ShouldBeGolden a where
shouldBeGolden :: a -> FilePath -> Golden a
instance ShouldBeGolden ParagraphLayout where
shouldBeGolden output_ name = Golden
{ output = output_
, encodePretty = show
, writeToFile = \path -> writeFile path . prettyShow
, readFromFile = \path -> readFile path >>= return . read
, goldenFile = ".golden" </> name </> "golden"
, actualFile = Just (".golden" </> name </> "actual")
, failFirstTime = False
}
emptyLayout :: ParagraphLayout
emptyLayout = ParagraphLayout (Rect 0 0 0 0) []
emptySpanLayout :: ParagraphLayout
emptySpanLayout = ParagraphLayout (Rect 0 0 0 0) [SpanLayout []]
spec :: Spec
spec = do
describe "layoutPlain" $ do
describe "with Arabic font" $ do
font <- runIO $ loadPlexSansArabicRegular
it "handles input with no spans" $ do
let opts = ParagraphOptions font Normal 8000
let result = layoutPlain $ emptyParagraph opts
result `shouldBe` emptyLayout
it "wraps filler text at 20em" $ do
let opts = ParagraphOptions font Normal 20000
let result = layoutPlain $ arabicFillerParagraph opts
result `shouldBeGolden` "arabicFiller20em"
it "wraps filler text with spans at 20em" $ do
let opts = ParagraphOptions font Normal 20000
let result = layoutPlain $ spannedArabicFillerParagraph opts
result `shouldBeGolden` "spannedArabicFiller20em"
it "spans do not reposition filler text at 20em" $ do
let opts = ParagraphOptions font Normal 20000
let withoutSpans = layoutPlain $ arabicFillerParagraph opts
let withSpans = layoutPlain $ spannedArabicFillerParagraph opts
paragraphRect withoutSpans `shouldBe` paragraphRect withSpans
describe "with Devanagari font" $ do
font <- runIO $ loadSaralaRegular
describe "lone accent character" $ do
let
opts = ParagraphOptions font Normal 8000
result = layoutPlain $
devanagariAccentParagraph opts
it "inserts a dotted circle" $ do
x_size (paragraphRect result) `shouldBe` 645
it "is golden" $ do
result `shouldBeGolden` "devanagariAccentParagraph"
describe "lone accent character after prefix" $ do
let
opts = ParagraphOptions font Normal 8000
result = layoutPlain $
devanagariPrefixedAccentParagraph opts
it "does not insert a dotted circle" $ do
x_size (paragraphRect result) `shouldBe` 0
it "is golden" $ do
result `shouldBeGolden` "devanagariPrefixedAccentParagraph"
it "handles input without wrapping" $ do
let opts = ParagraphOptions font Normal 9000
let result = layoutPlain $ devanagariParagraph opts
result `shouldBeGolden` "devanagariParagraph"
describe "with Latin font" $ do
-- Note: This font does not contain Japanese glyphs.
font <- runIO $ loadUbuntuRegular
it "handles input with no spans" $ do
let opts = ParagraphOptions font Normal 8000
let result = layoutPlain $ emptyParagraph opts
result `shouldBe` emptyLayout
it "handles one span with no text" $ do
let opts = ParagraphOptions font Normal 8000
let result = layoutPlain $ emptySpanParagraph opts
result `shouldBe` emptySpanLayout
it "handles Czech hello" $ do
let opts = ParagraphOptions font Normal 8000
let result = layoutPlain $ czechHelloParagraph opts
result `shouldBeGolden` "czechHelloParagraph"
it "renders an \"ffi\" ligature" $ do
let opts = ParagraphOptions font Normal 8000
let result = layoutPlain $ ligatureParagraph opts
result `shouldBeGolden` "ligatureParagraph"
it "breaks an \"ffi\" ligature into \"ff\" + \"i\"" $ do
let opts = ParagraphOptions font Normal 2418
let result = layoutPlain $ ligatureParagraph opts
result `shouldBeGolden` "ligatureParagraphBreak1"
it "breaks an \"ffi\" ligature into \"f\" + \"fi\"" $ do
let opts = ParagraphOptions font Normal 1800
let result = layoutPlain $ ligatureParagraph opts
result `shouldBeGolden` "ligatureParagraphBreak2"
it "handles mixed languages in LTR layout" $ do
let opts = ParagraphOptions font Normal 8000
let result = layoutPlain $ mixedLanguageLTRParagraph opts
result `shouldBeGolden` "mixedLanguageLTRParagraph"
it "handles normal line height" $ do
let opts = ParagraphOptions font Normal 8000
let result = layoutPlain $ trivialParagraph opts
result `shouldBeGolden` "lineHeightNormal"
it "handles larger line height" $ do
let opts = ParagraphOptions font (Absolute 1600) 8000
let result = layoutPlain $ trivialParagraph opts
result `shouldBeGolden` "lineHeightLarger"
it "handles smaller line height" $ do
let opts = ParagraphOptions font (Absolute 599) 8000
let result = layoutPlain $ trivialParagraph opts
result `shouldBeGolden` "lineHeightSmaller"
it "wraps mid-word when line is narrow" $ do
let opts = ParagraphOptions font Normal 1300
let result = layoutPlain $ czechHelloParagraph opts
result `shouldBeGolden` "czechHelloParagraphNarrow"
it "wraps by characters when line is ultra narrow" $ do
let opts = ParagraphOptions font Normal 100
let result = layoutPlain $ czechHelloParagraph opts
result `shouldBeGolden` "czechHelloParagraphUltraNarrow"
it "wraps lorem ipsum at 20em" $ do
let opts = ParagraphOptions font Normal 20000
let result = layoutPlain $ loremIpsumParagraph opts
result `shouldBeGolden` "loremIpsum20em"
it "wraps lorem ipsum at 100em" $ do
let opts = ParagraphOptions font Normal 100000
let result = layoutPlain $ loremIpsumParagraph opts
result `shouldBeGolden` "loremIpsum100em"
it "wraps lorem ipsum with spans at 20em" $ do
let opts = ParagraphOptions font Normal 20000
let result = layoutPlain $ spannedLoremIpsumParagraph opts
result `shouldBeGolden` "spannedLoremIpsum20em"
it "spans do not reposition lorem ipsum at 20em" $ do
let opts = ParagraphOptions font Normal 20000
let withoutSpans = layoutPlain $ loremIpsumParagraph opts
let withSpans = layoutPlain $ spannedLoremIpsumParagraph opts
paragraphRect withoutSpans `shouldBe` paragraphRect withSpans
it "wraps mixed-script words correctly" $ do
let opts = ParagraphOptions font Normal 6000
let result = layoutPlain $ mixedScriptWordsParagraph opts
result `shouldBeGolden` "mixedScriptWordsParagraph"