From 42aca57dee8d88afa5fac512aeb1198102908865 Mon Sep 17 00:00:00 2001 From: fiddlosopher Date: Sat, 24 Jan 2009 20:00:26 +0000 Subject: Moved all haskell source to src subdirectory. git-svn-id: https://pandoc.googlecode.com/svn/trunk@1528 788f1e2b-df1e-0410-8736-df70ead52e1b --- Text/Pandoc/Writers/S5.hs | 157 ---------------------------------------------- 1 file changed, 157 deletions(-) delete mode 100644 Text/Pandoc/Writers/S5.hs (limited to 'Text/Pandoc/Writers/S5.hs') diff --git a/Text/Pandoc/Writers/S5.hs b/Text/Pandoc/Writers/S5.hs deleted file mode 100644 index 6f528503a..000000000 --- a/Text/Pandoc/Writers/S5.hs +++ /dev/null @@ -1,157 +0,0 @@ -{-# LANGUAGE CPP, TemplateHaskell #-} -{- -Copyright (C) 2006-7 John MacFarlane - -This program is free software; you can redistribute it and/or modify -it under the terms of the GNU General Public License as published by -the Free Software Foundation; either version 2 of the License, or -(at your option) any later version. - -This program is distributed in the hope that it will be useful, -but WITHOUT ANY WARRANTY; without even the implied warranty of -MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -GNU General Public License for more details. - -You should have received a copy of the GNU General Public License -along with this program; if not, write to the Free Software -Foundation, Inc., 59 Temple Place, Suite 330, Boston, MA 02111-1307 USA --} - -{- | - Module : Text.Pandoc.Writers.S5 - Copyright : Copyright (C) 2006-7 John MacFarlane - License : GNU GPL, version 2 or above - - Maintainer : John MacFarlane - Stability : alpha - Portability : portable - -Definitions for creation of S5 powerpoint-like HTML. -(See .) --} -module Text.Pandoc.Writers.S5 ( - -- * Strings - s5Meta, - s5Javascript, - s5CSS, - s5Links, - -- * Functions - writeS5, - writeS5String, - insertS5Structure - ) where -import Text.Pandoc.Shared ( WriterOptions ) -import Text.Pandoc.TH ( contentsOf ) -import Text.Pandoc.Writers.HTML ( writeHtml, writeHtmlString ) -import Text.Pandoc.Definition -import Text.XHtml.Strict -import System.FilePath ( () ) -import Data.List ( intercalate ) - -s5Meta :: String -s5Meta = "\n\n\n" - -s5Javascript :: String -#ifndef __HADDOCK__ -s5Javascript = "\n" -#endif - -s5CoreCSS :: String -#ifndef __HADDOCK__ -s5CoreCSS = $(contentsOf $ "data" "ui" "default" "s5-core.css") -#endif - -s5FramingCSS :: String -#ifndef __HADDOCK__ -s5FramingCSS = $(contentsOf $ "data" "ui" "default" "framing.css") -#endif - -s5PrettyCSS :: String -#ifndef __HADDOCK__ -s5PrettyCSS = $(contentsOf $ "data" "ui" "default" "pretty.css") -#endif - -s5OperaCSS :: String -#ifndef __HADDOCK__ -s5OperaCSS = $(contentsOf $ "data" "ui" "default" "opera.css") -#endif - -s5OutlineCSS :: String -#ifndef __HADDOCK__ -s5OutlineCSS = $(contentsOf $ "data" "ui" "default" "outline.css") -#endif - -s5PrintCSS :: String -#ifndef __HADDOCK__ -s5PrintCSS = $(contentsOf $ "data" "ui" "default" "print.css") -#endif - -s5CSS :: String -s5CSS = "\n\n\n\n" - -s5Links :: String -s5Links = "\n\n\n\n\n\n\n" - --- | Converts Pandoc document to an S5 HTML presentation (Html structure). -writeS5 :: WriterOptions -> Pandoc -> Html -writeS5 options = (writeHtml options) . insertS5Structure - --- | Converts Pandoc document to an S5 HTML presentation (string). -writeS5String :: WriterOptions -> Pandoc -> String -writeS5String options = (writeHtmlString options) . insertS5Structure - --- | Inserts HTML needed for an S5 presentation (e.g. around slides). -layoutDiv :: [Inline] -- ^ Title of document (for header or footer) - -> String -- ^ Date of document (for header or footer) - -> [Block] -- ^ List of block elements returned -layoutDiv title' date = [(RawHtml "
\n
\n
\n
\n
\n"), (Header 1 [Str date]), (Header 2 title'), (RawHtml "
\n
\n")] - -presentationStart :: Block -presentationStart = RawHtml "
\n\n" - -presentationEnd :: Block -presentationEnd = RawHtml "
\n" - -slideStart :: Block -slideStart = RawHtml "
\n" - -slideEnd :: Block -slideEnd = RawHtml "
\n" - --- | Returns 'True' if block is a Header 1. -isH1 :: Block -> Bool -isH1 (Header 1 _) = True -isH1 _ = False - --- | Insert HTML around sections to make individual slides. -insertSlides :: Bool -> [Block] -> [Block] -insertSlides beginning blocks = - let (beforeHead, rest) = break isH1 blocks in - if (null rest) then - if beginning then - beforeHead - else - beforeHead ++ [slideEnd] - else - if beginning then - beforeHead ++ - slideStart:(head rest):(insertSlides False (tail rest)) - else - beforeHead ++ - slideEnd:slideStart:(head rest):(insertSlides False (tail rest)) - --- | Insert blocks into 'Pandoc' for slide structure. -insertS5Structure :: Pandoc -> Pandoc -insertS5Structure (Pandoc meta' []) = Pandoc meta' [] -insertS5Structure (Pandoc (Meta title' authors date) blocks) = - let slides = insertSlides True blocks - firstSlide = if not (null title') - then [slideStart, (Header 1 title'), - (Header 3 [Str (intercalate ", " authors)]), - (Header 4 [Str date]), slideEnd] - else [] - newBlocks = (layoutDiv title' date) ++ presentationStart:firstSlide ++ - slides ++ [presentationEnd] - in Pandoc (Meta title' authors date) newBlocks -- cgit v1.2.3