-
Notifications
You must be signed in to change notification settings - Fork 44
/
Copy pathExampleExtractor.hs
363 lines (314 loc) · 11.8 KB
/
ExampleExtractor.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
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
176
177
178
179
180
181
182
183
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
207
208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
260
261
262
263
264
265
266
267
268
269
270
271
272
273
274
275
276
277
278
279
280
281
282
283
284
285
286
287
288
289
290
291
292
293
294
295
296
297
298
299
300
301
302
303
304
305
306
307
308
309
310
311
312
313
314
315
316
317
318
319
320
321
322
323
324
325
326
327
328
329
330
331
332
333
334
335
336
337
338
339
340
341
342
343
344
345
346
347
348
349
350
351
352
353
354
355
356
357
358
359
360
361
362
363
{-# language QuasiQuotes #-}
{-# language TemplateHaskell #-}
{-# language CPP #-}
module ExampleExtractor
( Animation
, renderImage
, renderAnimation
, extractExampleImages
) where
import "base" Control.Arrow ( (***), (&&&) )
import "base" Control.Monad
import "base" Data.Bifunctor
import "base" Data.Either
import "base" Data.Maybe
import "base" Data.Word
import qualified "containers" Data.Map.Strict as M
import "directory" System.Directory ( canonicalizePath )
import qualified "haskell-src-exts" Language.Haskell.Exts.Extension as Hse
import qualified "haskell-src-exts" Language.Haskell.Exts.Parser as Hse
import qualified "haskell-src-exts" Language.Haskell.Exts.Syntax as Hse
import qualified "haskell-src-exts" Language.Haskell.Exts.SrcLoc as Hse
import qualified "Glob" System.FilePath.Glob as G
import "JuicyPixels" Codec.Picture.ColorQuant as JP
import "JuicyPixels" Codec.Picture.Gif as JP
import "JuicyPixels" Codec.Picture.Types as JP
import qualified "opencv" OpenCV as CV
import qualified "opencv" OpenCV.Juicy as CVJ
import qualified "text" Data.Text as T
import qualified "text" Data.Text.Encoding as TE
import qualified "bytestring" Data.ByteString as B
import qualified "bytestring" Data.ByteString.Lazy as BL
import "template-haskell" Language.Haskell.TH
import "template-haskell" Language.Haskell.TH.Syntax
import "haskell-src-meta" Language.Haskell.Meta.Syntax.Translate ( toDecs )
#if !MIN_VERSION_base(4,11,0)
import "base" Data.Monoid
#endif
--------------------------------------------------------------------------------
-- An animation is a list of images. Each image has a duration
-- specified in hundreths of a second.
type Animation shape channels depth = [(Int, CV.Mat shape channels depth)]
--------------------------------------------------------------------------------
renderImage
:: FilePath
-> CV.Mat ('CV.S [height, width]) channels depth
-> IO ()
renderImage fp img = do
let bs = CV.exceptError $ CV.imencode (CV.OutputPng CV.defaultPngParams) img
putStr $ "Writing image " <> dest <> " ..."
B.writeFile dest bs
putStrLn " OK"
where
dest = mkDestPath fp
renderAnimation
:: FilePath
-> Animation ('CV.S [height, width]) ('CV.S 3) ('CV.S Word8)
-> IO ()
renderAnimation fp imgs = do
putStr $ "Writing animation " <> dest <> " ..."
case gif of
Left errMsg -> putStrLn $ " " <> errMsg
Right bs -> BL.writeFile dest bs
putStrLn " OK"
where
gif :: Either String BL.ByteString
gif = JP.encodeGifImages JP.LoopingForever palImgs
palImgs :: [(JP.Palette, JP.GifDelay, JP.Image JP.Pixel8)]
palImgs =
map (\(delay, img) ->
let (img8, pal) = JP.palettize JP.defaultPaletteOptions img
in (pal, delay, img8)
)
jpImgs
jpImgs :: [(JP.GifDelay, JP.Image JP.PixelRGB8)]
jpImgs = map (second CVJ.toImage) imgs
dest = mkDestPath fp
mkDestPath :: FilePath -> FilePath
mkDestPath fp = "doc/generated/" <> fp
--------------------------------------------------------------------------------
data SrcLoc
= SrcLoc
{ locFile :: !FilePath
, locLine :: !Int
}
-- | Haskell source code containing 0, 1 or more examples.
data ExampleSrc
= ExampleSrc
{ exsLoc :: !SrcLoc
, exsSrc :: !T.Text
}
data ParsedExampleSrc
= ParsedExampleSrc
{ pexsLoc :: !SrcLoc
, pexsDecls :: ![Dec]
}
-- | A single line of Haskell source code.
data SrcLine
= SrcLine
{ srcLoc :: !SrcLoc
, srcLine :: !T.Text
}
data SymbolType
= SymImage
| SymImageAction
deriving (Show, Eq)
data ExampleProps
= ExampleProps
{ exPropIO :: !Bool
, exPropAnimation :: !Bool
} deriving Show
data RenderTarget
= RenderTarget
{ rtDestination :: !FilePath
-- ^ Relative path where the symbol must be rendered as an image file.
, rtSymbolName :: !Name
-- ^ Name of a top level symbol (function or CAF) that is either an image
-- or an IO action that yields an image.
, rtSymbolProps :: !ExampleProps
} deriving Show
--------------------------------------------------------------------------------
extractExampleImages :: FilePath -> Q [Dec]
extractExampleImages srcDir = do
haskellPaths <- runIO $ findHaskellPaths srcDir
mapM_ (addDependentFile <=< runIO . canonicalizePath) haskellPaths
((exampleSrcs, renderTargets) :: ([ExampleSrc], [RenderTarget])) <- runIO $ do
xs <- mapM findExamples haskellPaths
pure $ (concat *** concat) $ unzip xs
let parseErrors :: [String]
parsedExampleSrcs :: [ParsedExampleSrc]
(parseErrors, parsedExampleSrcs) = partitionEithers $ map parseExampleSrc exampleSrcs
examplesTH :: [Dec]
examplesTH = concatMap (\pexs -> parsedExampleLinePragma pexs : pexsDecls pexs)
parsedExampleSrcs
exampleTypes :: M.Map Name Type
exampleTypes = M.fromList $ mapMaybe asSigD examplesTH
renderTargets' :: [RenderTarget]
renderTargets' =
mapMaybe
(\rt -> do
exampleType <- M.lookup (rtSymbolName rt) exampleTypes
pure rt {rtSymbolProps = classifyExample exampleType}
)
renderTargets
unless (null parseErrors) $
error $ show parseErrors
mdecs <- mkRenderExampleImages renderTargets'
pure $ examplesTH <> mdecs
parsedExampleLinePragma :: ParsedExampleSrc -> Dec
parsedExampleLinePragma pexs =
PragmaD $ LineP (locLine loc) (locFile loc)
where
loc = pexsLoc pexs
parseExampleSrc :: ExampleSrc -> Either String ParsedExampleSrc
parseExampleSrc exs =
case parseDecsHse (locFile $ exsLoc exs) $ T.unpack $ haddockToHaskell $ exsSrc exs of
Left errMsg -> Left $ (locFile $ exsLoc exs) <> ": " <> errMsg
Right decls -> Right
ParsedExampleSrc
{ pexsLoc = exsLoc exs
, pexsDecls = toDecs decls
}
asSigD :: Dec -> Maybe (Name, Type)
asSigD (SigD n t) = Just (n, t)
asSigD _ = Nothing
-- Really hacky way of determining the properties of an example based
-- on its type.
classifyExample :: Type -> ExampleProps
classifyExample (ForallT _ _ t) = classifyExample t
classifyExample (AppT (ConT n) t2) | nameBase n == nameBase ''IO = checkIOAnimation t2
classifyExample (AppT t1 _) = classifyExample t1
classifyExample (VarT _) = ExampleProps False False
classifyExample (ConT n) | nameBase n == nameBase ''Animation = ExampleProps False True
classifyExample (PromotedT _) = ExampleProps False False
classifyExample _ = ExampleProps False False
checkIOAnimation :: Type -> ExampleProps
checkIOAnimation (ForallT _ _ t) = checkIOAnimation t
checkIOAnimation (AppT t1 _) = checkIOAnimation t1
checkIOAnimation (VarT _) = ExampleProps True False
checkIOAnimation (ConT n) | nameBase n == nameBase ''Animation = ExampleProps True True
checkIOAnimation (PromotedT _) = ExampleProps True False
checkIOAnimation _ = ExampleProps True False
parseDecsHse :: String -> String -> Either String [Hse.Decl Hse.SrcSpanInfo]
parseDecsHse fileName str =
case Hse.parseModuleWithMode (parseMode fileName) str of
Hse.ParseFailed _srcLoc err -> Left err
Hse.ParseOk (Hse.Module _ _ _ _ decls) -> Right decls
Hse.ParseOk _ -> Left "Invalid module"
parseMode :: String -> Hse.ParseMode
parseMode fileName =
Hse.ParseMode
{ Hse.parseFilename = fileName
, Hse.baseLanguage = Hse.Haskell2010
, Hse.extensions = map Hse.EnableExtension exts
, Hse.ignoreLanguagePragmas = False
, Hse.ignoreLinePragmas = False
, Hse.fixities = Nothing
, Hse.ignoreFunctionArity = False
}
where
exts :: [Hse.KnownExtension]
exts =
[ Hse.BangPatterns
, Hse.DataKinds
, Hse.FlexibleContexts
, Hse.LambdaCase
, Hse.OverloadedStrings
, Hse.PackageImports
, Hse.PolyKinds
, Hse.ScopedTypeVariables
, Hse.TupleSections
, Hse.TypeFamilies
, Hse.TypeOperators
, Hse.PostfixOperators
, Hse.QuasiQuotes
, Hse.UnicodeSyntax
, Hse.MagicHash
, Hse.PatternSignatures
, Hse.MultiParamTypeClasses
, Hse.RankNTypes
]
-- | Generate code for every render target
--
-- Executing the generated code will actually render the target.
mkRenderExampleImages :: [RenderTarget] -> Q [Dec]
mkRenderExampleImages renderTargets = [d|
renderExampleImages :: IO ()
renderExampleImages = $(pure doRender)
|]
where
doRender :: Exp
doRender =
DoE Nothing $ do
rt <- renderTargets
let sym = VarE $ rtSymbolName rt
fp = LitE $ StringL $ "examples/" <> rtDestination rt
props = rtSymbolProps rt
render | exPropAnimation props = 'renderAnimation
| otherwise = 'renderImage
pure $ NoBindS $
if exPropIO props
then VarE '(>>=) `AppE` sym `AppE` (VarE render `AppE` fp)
else VarE render `AppE` fp `AppE` sym
#if MIN_VERSION_Glob(0,9,0)
findHaskellPaths :: FilePath -> IO [FilePath]
findHaskellPaths = fmap concat . G.globDir [G.compile "**/*.hs", G.compile "**/*.hsc"]
#else
findHaskellPaths srcDir = do
(paths, _) <- G.globDir [G.compile "**/*.hs", G.compile "**/*.hsc"] srcDir
pure $ concat paths
#endif
haddockToHaskell :: T.Text -> T.Text
haddockToHaskell =
T.replace "\\\\" "\\"
. T.replace "\\`" "`"
. T.replace "\\<" "<"
. T.replace "\\/" "/"
findExamples :: FilePath -> IO ([ExampleSrc], [RenderTarget])
findExamples fp = ((parseExamples &&& parseGeneratedImages) . textToSource fp) <$> readFileUtf8 fp
-- https://www.snoyman.com/blog/2016/12/beware-of-readfile
-- Data.Text.readFile has problems with character encoding.
readFileUtf8 :: FilePath -> IO T.Text
readFileUtf8 = fmap TE.decodeUtf8 . B.readFile
textToSource :: FilePath -> T.Text -> [SrcLine]
textToSource fp txt = zipWith lineToSource [1..] (T.lines txt)
where
lineToSource :: Int -> T.Text -> SrcLine
lineToSource n line =
SrcLine
{ srcLoc = SrcLoc {locFile = fp, locLine = n}
, srcLine = line
}
parseExamples :: [SrcLine] -> [ExampleSrc]
parseExamples = findStart
where
findStart :: [SrcLine] -> [ExampleSrc]
findStart [] = []
findStart (_:[]) = []
findStart (_:_:[]) = []
findStart (a:b:c:ls)
| srcLine a == "Example:"
, srcLine b == ""
, srcLine c == "@"
= findEnd [] ls
findStart (_:ls) = findStart ls
findEnd :: [SrcLine] -> [SrcLine] -> [ExampleSrc]
findEnd _acc [] = []
findEnd acc (l:ls)
| srcLine l == "@" =
case reverse acc of
[] -> findStart ls
revAcc@(firstLine:_) ->
let exs = ExampleSrc
{ exsLoc = srcLoc firstLine
, exsSrc = T.unlines (map srcLine revAcc)
}
in exs : findStart ls
| otherwise = findEnd (l:acc) ls
parseGeneratedImages :: [SrcLine] -> [RenderTarget]
parseGeneratedImages = concatMap $ parseLine . srcLine
where
parseLine :: T.Text -> [RenderTarget]
parseLine line = maybeToList $ do
let fromPrefix = snd $ T.breakOn prefix line
rest <- T.stripPrefix prefix fromPrefix
case take 2 $ T.words rest of
[fp, funcName] ->
pure RenderTarget
{ rtDestination = T.unpack $ fp
, rtSymbolName = mkName $ T.unpack $ fromMaybe funcName (T.stripSuffix ">>" funcName)
-- Later on we will determine the actual properties.
, rtSymbolProps = ExampleProps False False
}
_ -> Nothing
prefix = "<<doc/generated/examples/"