diagrams-postscript-1.5: Postscript backend for diagrams drawing EDSL

Copyright(c) 2013 Diagrams team (see LICENSE)
LicenseBSD-style (see LICENSE)
Maintainerdiagrams-discuss@googlegroups.com
Safe HaskellNone
LanguageHaskell2010

Diagrams.Backend.Postscript

Contents

Description

A Postscript rendering backend for diagrams.

To build diagrams for Postscript rendering use the Postscript type in the diagram type construction

d :: Diagram Postscript
d = ...

and render giving the Postscript token

renderDia Postscript (PostscriptOptions "file.eps" (Width 400) EPS) d

This IO action will write the specified file.

Synopsis

Backend token

data Postscript Source #

This data declaration is simply used as a token to distinguish this rendering engine.

Constructors

Postscript 
Instances
Eq Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Ord Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Read Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Show Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Backend Postscript V2 Double Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Mainable [(String, QDiagram Postscript V2 Double Any)] Source # 
Instance details

Defined in Diagrams.Backend.Postscript.CmdLine

Associated Types

type MainOpts [(String, QDiagram Postscript V2 Double Any)] :: Type #

Mainable [QDiagram Postscript V2 Double Any] Source # 
Instance details

Defined in Diagrams.Backend.Postscript.CmdLine

Associated Types

type MainOpts [QDiagram Postscript V2 Double Any] :: Type #

Renderable (Text Double) Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Renderable (Path V2 Double) Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Renderable (Trail V2 Double) Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Show (Options Postscript V2 Double) Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Semigroup (Render Postscript V2 Double) Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Monoid (Render Postscript V2 Double) Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Mainable (Animation Postscript V2 Double) Source # 
Instance details

Defined in Diagrams.Backend.Postscript.CmdLine

Associated Types

type MainOpts (Animation Postscript V2 Double) :: Type #

Hashable (Options Postscript V2 Double) Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Renderable (Segment Closed V2 Double) Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Mainable (QDiagram Postscript V2 Double Any) Source # 
Instance details

Defined in Diagrams.Backend.Postscript.CmdLine

Associated Types

type MainOpts (QDiagram Postscript V2 Double Any) :: Type #

type V Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

type V Postscript = V2
type N Postscript Source # 
Instance details

Defined in Diagrams.Backend.Postscript

data Options Postscript V2 Double Source # 
Instance details

Defined in Diagrams.Backend.Postscript

type Result Postscript V2 Double Source # 
Instance details

Defined in Diagrams.Backend.Postscript

data Render Postscript V2 Double Source # 
Instance details

Defined in Diagrams.Backend.Postscript

data Render Postscript V2 Double = C (RenderM ())
type MainOpts [(String, QDiagram Postscript V2 Double Any)] Source # 
Instance details

Defined in Diagrams.Backend.Postscript.CmdLine

type MainOpts [QDiagram Postscript V2 Double Any] Source # 
Instance details

Defined in Diagrams.Backend.Postscript.CmdLine

type MainOpts (Animation Postscript V2 Double) Source # 
Instance details

Defined in Diagrams.Backend.Postscript.CmdLine

type MainOpts (QDiagram Postscript V2 Double Any) Source # 
Instance details

Defined in Diagrams.Backend.Postscript.CmdLine

Postscript-specific options

Unfortunately, Haddock does not yet support documentation for associated data families, so we must just provide it manually. This module defines

data family Options Postscript V2 Double = PostscriptOptions
          { _psfileName     :: String             -- ^ the name of the file you want generated
          , _psSizeSpec     :: SizeSpec V2 Double -- ^ the requested size of the output
          , _psOutputFormat :: OutputFormat        -- ^ the output format and associated options
          }

Postscript-supported output formats

data OutputFormat Source #

Postscript only supports EPS style output at the moment. Future formats would each have their own associated properties that affect the output.

Constructors

EPS

Encapsulated Postscript output.

Instances
Bounded OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Enum OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Eq OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Ord OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Read OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Show OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Generic OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

Associated Types

type Rep OutputFormat :: Type -> Type #

Hashable OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

type Rep OutputFormat Source # 
Instance details

Defined in Diagrams.Backend.Postscript

type Rep OutputFormat = D1 (MetaData "OutputFormat" "Diagrams.Backend.Postscript" "diagrams-postscript-1.5-4rr0AQt92wjCHteCT788wq" False) (C1 (MetaCons "EPS" PrefixI False) (U1 :: Type -> Type))