aboutsummaryrefslogtreecommitdiff
path: root/benchmark
diff options
context:
space:
mode:
authorJohn MacFarlane <jgm@berkeley.edu>2021-02-22 22:10:20 -0800
committerJohn MacFarlane <jgm@berkeley.edu>2021-02-22 22:10:20 -0800
commitd7cfa0ef4c926d6bb91d0a870edeea8911d81c3a (patch)
tree3e4ab70ce50b887a93bc199a037653d64da4a77c /benchmark
parent21d0b4745b46f8622b31647c81a9d9178b1a579d (diff)
downloadpandoc-d7cfa0ef4c926d6bb91d0a870edeea8911d81c3a.tar.gz
Remove weigh-pandoc.
It's not really useful any more, now that our regular benchmarks include data on allocation.
Diffstat (limited to 'benchmark')
-rw-r--r--benchmark/weigh-pandoc.hs48
1 files changed, 0 insertions, 48 deletions
diff --git a/benchmark/weigh-pandoc.hs b/benchmark/weigh-pandoc.hs
deleted file mode 100644
index b77fa9ee9..000000000
--- a/benchmark/weigh-pandoc.hs
+++ /dev/null
@@ -1,48 +0,0 @@
-{-# LANGUAGE OverloadedStrings #-}
-{- |
- Module : Main
- Copyright : © 2016-2021 John MacFarlane <jgm@berkeley.edu>
- License : GNU GPL, version 2 or above
-
- Maintainer : John MacFarlane <jgm@berkeley.edu>
- Stability : alpha
- Portability : portable
-
-Benchmarks to determine resource use of readers and writers.
--}
-import Weigh
-import Text.Pandoc
-import Data.Text (Text, unpack)
-
-main :: IO ()
-main = do
- doc <- read <$> readFile "test/testsuite.native"
- mainWith $ do
- func "Pandoc document" id doc
- mapM_
- (\(n,r) -> weighReader doc n (either (error . show) id . runPure . r def{readerExtensions = pandocExtensions}))
- [("markdown", readMarkdown)
- ,("html", readHtml)
- ,("docbook", readDocBook)
- ,("latex", readLaTeX)
- ,("commonmark", readCommonMark)
- ]
- mapM_
- (\(n,w) -> weighWriter doc n (either (error . show) id . runPure . w def))
- [("markdown", writeMarkdown)
- ,("html", writeHtml5String)
- ,("docbook", writeDocbook5)
- ,("latex", writeLaTeX)
- ,("commonmark", writeCommonMark)
- ]
-
-weighWriter :: Pandoc -> String -> (Pandoc -> Text) -> Weigh ()
-weighWriter doc name writer = func (name ++ " writer") writer doc
-
-weighReader :: Pandoc -> Text -> (Text -> Pandoc) -> Weigh ()
-weighReader doc name reader =
- case lookup name writers of
- Just (TextWriter writer) ->
- let inp = either (error . show) id $ runPure $ writer def{ writerWrapText = WrapAuto} doc
- in func (unpack $ name <> " reader") reader inp
- _ -> return () -- no writer for reader