funcmp-1.9: Functional MetaPost is a Haskell frontend to the MetaPost language

Copyright(c) 2003-2010 Peter Simons
(c) 2002-2003 Ferenc Wágner
(c) 2002-2003 Meik Hellmund
(c) 1998-2002 Ralf Hinze
(c) 1998-2002 Joachim Korittky
(c) 1998-2002 Marco Kuhlmann
LicenseGPLv3
Maintainersimons@cryp.to
Stabilityprovisional
Portabilityportable
Safe HaskellSafe
LanguageHaskell98

FMP

Description

 

Synopsis

Documentation

module FMP.Canvas

module FMP.Color

module FMP.Core

module FMP.File

module FMP.Frames

module FMP.Matrix

data Doc :: * #

The abstract type of documents. A Doc represents a set of layouts. A Doc with no occurrences of Union or NoDoc represents just one layout.

Instances

Eq Doc 

Methods

(==) :: Doc -> Doc -> Bool #

(/=) :: Doc -> Doc -> Bool #

Show Doc 

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

IsString Doc 

Methods

fromString :: String -> Doc #

Generic Doc 

Associated Types

type Rep Doc :: * -> * #

Methods

from :: Doc -> Rep Doc x #

to :: Rep Doc x -> Doc #

Semigroup Doc 

Methods

(<>) :: Doc -> Doc -> Doc #

sconcat :: NonEmpty Doc -> Doc #

stimes :: Integral b => b -> Doc -> Doc #

Monoid Doc 

Methods

mempty :: Doc #

mappend :: Doc -> Doc -> Doc #

mconcat :: [Doc] -> Doc #

NFData Doc 

Methods

rnf :: Doc -> () #

type Rep Doc 
type Rep Doc = D1 * (MetaData "Doc" "Text.PrettyPrint.HughesPJ" "pretty-1.1.3.3" True) (C1 * (MetaCons "Doc" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Doc ()))))

module FMP.Syntax

module FMP.Term

module FMP.Tree

module FMP.Turtle

module FMP.Types

generate :: IsPicture a => String -> Int -> a -> IO () Source #

emit|s a file called NAME.MP (or NAME.NUMBER.MP in not |newmp|) with a beginfig(NUMBER) in it, and runs MetaPost on it. The conversion to |MetaPost|, which |HasEmit|, is done by |metaPost|. Finally, the emitted |Doc| is |show|n.

wferi )

funcmp :: IsPicture a => String -> Int -> a -> IO () Source #