|
|
|
|
|
|
|
| Documentation |
|
| (|-|) :: (IsPicture a, IsPicture b) => a -> b -> Picture |
|
| (|||) :: (IsPicture a, IsPicture b) => a -> b -> Picture |
|
| (|=|) :: (IsPicture a, IsPicture b) => a -> b -> Picture |
|
| (||||) :: (IsPicture a, IsPicture b) => a -> b -> Picture |
|
| (#) :: a -> (a -> b) -> b |
|
| (.&.) :: (IsPath a, IsPath b) => a -> b -> Path |
|
| (...) :: (IsPath a, IsPath b) => a -> b -> Path |
|
| (.-.) :: (IsPath a, IsPath b) => a -> b -> Path |
|
| (....) :: (IsPath a, IsPath b) => a -> b -> Path |
|
| (.--.) :: (IsPath a, IsPath b) => a -> b -> Path |
|
| class Show a => IsPicture a where |
| | Methods | | | Instances | |
|
|
| class IsPath a where |
| | Methods | | toPath :: a -> Path | | | toPathList :: [a] -> Path |
| | Instances | |
|
|
| class IsArea a where |
| | Methods | | | Instances | |
|
|
| class HasPicture a where |
| | Methods | | | Instances | |
|
|
| class HasName a where |
| | Methods | | setName :: IsName b => b -> a -> a | | | getNames :: a -> [Name] |
| | Instances | |
|
|
| class HasDXY a where |
| | Methods | | | Instances | |
|
|
| class HasExtent a where |
| | Methods | | | Instances | |
|
|
| class HasLabel a where |
| | Methods | | | Instances | |
|
|
| class HasPattern a where |
| | Methods | | setPattern :: Pattern -> a -> a | | | setDefaultPattern :: a -> a | | | getPattern :: a -> Pattern |
| | Instances | |
|
|
| class HasPen a where |
| | Methods | | setPen :: Pen -> a -> a | | | setDefaultPen :: a -> a | | | getPen :: a -> Pen |
| | Instances | |
|
|
| class HasArrowHead a where |
| | Methods | | | Instances | |
|
|
| class HasStartEndCut a where |
| | Methods | | setStartCut :: IsName b => b -> a -> a | | | removeStartCut :: a -> a | | | setEndCut :: IsName b => b -> a -> a | | | removeEndCut :: a -> a |
| | Instances | |
|
|
| class HasStartEndDir a where |
| | Methods | | setStartAngle :: Numeric -> a -> a | | | setEndAngle :: Numeric -> a -> a | | | setStartCurl :: Numeric -> a -> a | | | setEndCurl :: Numeric -> a -> a | | | setStartVector :: Point -> a -> a | | | setEndVector :: Point -> a -> a | | | removeStartDir :: a -> a | | | removeEndDir :: a -> a |
| | Instances | |
|
|
| class HasJoin a where |
| | Methods | | | Instances | |
|
|
| class HasShadow a where |
| | Methods | | | Instances | |
|
|
| class HasLayer a where |
| | Methods | | setBack :: a -> a | | | setFront :: a -> a | | | getLayer :: a -> Layer |
| | Instances | |
|
|
| class HasConcat a where |
| | Methods | | | Instances | |
|
|
| class IsHideable a where |
| | Methods | | | Instances | |
|
|
| joinCat :: BasicJoin |
|
| joinFree :: BasicJoin |
|
| joinBounded :: BasicJoin |
|
| joinStraight :: BasicJoin |
|
| joinTense :: BasicJoin |
|
| joinTension :: Tension -> BasicJoin |
|
| joinTensions :: Tension -> Tension -> BasicJoin |
|
| joinControl :: Point -> BasicJoin |
|
| joinControls :: Point -> Point -> BasicJoin |
|
| tension :: Numeric -> Tension |
|
| tensionAtLeast :: Numeric -> Tension |
|
| buildCycle :: Path -> Path -> Path |
|
| transformPath :: Transformation -> Path -> Path |
|
| mm :: Numeric |
|
| pt :: Numeric |
|
| dd :: Numeric |
|
| bp :: Numeric |
|
| cm :: Numeric |
|
| pc :: Numeric |
|
| cc :: Numeric |
|
| inch :: Numeric |
|
| up :: Point |
|
| down :: Point |
|
| left :: Point |
|
| right :: Point |
|
| fullcircle :: Path |
|
| halfcircle :: Path |
|
| quartercircle :: Path |
|
| unitsquare :: Path |
|
| enumPics :: HasName a => [a] -> [a] |
|
| image :: BitDepth -> [String] -> Picture |
|
| data Picture |
| Constructors | | Instances | |
|
|
| data Layer |
| Constructors | | Instances | |
|
|
| data Transformation |
| Constructors | | Instances | |
|
|
| data BitDepth |
| Constructors | | Instances | |
|
|
| row :: IsPicture a => [a] -> Picture |
|
| column :: IsPicture a => [a] -> Picture |
|
| rowSepBy :: IsPicture a => Numeric -> [a] -> Picture |
|
| columnSepBy :: IsPicture a => Numeric -> [a] -> Picture |
|
| vspace :: Numeric -> Picture |
|
| hspace :: Numeric -> Picture |
|
| space :: Numeric -> Numeric -> Picture |
|
| fill :: (IsPicture a, IsArea b) => [b] -> a -> Picture |
|
| clip :: IsPicture a => Path -> a -> Picture |
|
| draw :: IsPicture a => [Path] -> a -> Picture |
|
| at :: (IsPicture a, IsPicture b) => Dir -> a -> b -> Picture |
|
| label :: (IsPicture a, IsPicture b) => Dir -> a -> b -> Picture |
|
| overlay :: IsPicture a => [Equation] -> [a] -> Picture |
|
| overlay' :: IsPicture a => [Equation] -> Maybe Int -> [a] -> Picture |
|
| ooalign :: IsPicture a => [a] -> Picture |
|
| class HasDefine a where |
| | Methods | | | Instances | |
|
|
| text :: String -> Picture |
|
| tex :: String -> Picture |
|
| math :: String -> Picture |
|
| empty :: Picture |
|
| setTrueBoundingBox :: IsPicture a => a -> Picture |
|
| scale :: IsPicture a => Numeric -> a -> Picture |
|
| rotate :: IsPicture a => Numeric -> a -> Picture |
|
| transform :: IsPicture a => Transformation -> a -> Picture |
|
| affine :: (Numeric, Numeric, Numeric, Numeric, Numeric, Numeric) -> Transformation |
|
| shifted :: (Numeric, Numeric) -> Transformation |
|
| rotated :: Numeric -> Transformation |
|
| reflectedX :: Transformation |
|
| reflectedY :: Transformation |
|
| reflectX :: IsPicture a => a -> Picture |
|
| reflectY :: IsPicture a => a -> Picture |
|
| scaledX :: Numeric -> Transformation |
|
| scaledY :: Numeric -> Transformation |
|
| scaled :: Numeric -> Transformation |
|
| skewedX :: Numeric -> Transformation |
|
| skewX :: IsPicture a => Numeric -> a -> Picture |
|
| skewedY :: Numeric -> Transformation |
|
| skewY :: IsPicture a => Numeric -> a -> Picture |
|
| line :: (IsPath a, IsPath b) => a -> b -> Path |
|
| curve :: (IsPath a, IsPath b) => a -> b -> Path |
|
| arrow :: (IsPath b, IsPath a) => a -> b -> Path |
|
| cycle' :: Path |
|
| lastNameIsDir :: Name -> Bool |
|
| defaultArrowHead :: ArrowHead |
|
| arrowHeadBig :: ArrowHead |
|
| arrowHeadSize :: Double -> Double -> ArrowHead |
|
| setArrowHeadStyle :: ArrowHeadStyle -> ArrowHead -> ArrowHead |
|
| getArrowHeadStyle :: ArrowHead -> ArrowHeadStyle |
|
| ahFilled :: ArrowHeadStyle |
|
| ahLine :: ArrowHeadStyle |
|
| data Attrib |
| Constructors | | Instances | |
|
|
| stdAttrib :: Attrib |
|
| data FrameAttrib |
| Constructors | | Instances | |
|
|
| stdFrameAttrib :: FrameAttrib |
|
| data PathElemDescr |
| Constructors | | Instances | |
|
|
| stdPathElemDescr :: PathElemDescr |
|
| data Path |
| Constructors | | Instances | |
|
|
| data PathLabel |
| Constructors | | Instances | |
|
|
| data ArrowHead |
| Constructors | | Instances | |
|
|
| data ArrowHeadStyle |
| Constructors | | Instances | |
|
|
| data CutPic |
| Constructors | | Instances | |
|
|
| pathLength :: Num a => Path -> a |
|
| forEachPath :: (PathElemDescr -> PathElemDescr) -> Path -> Path |
|
| data Dir' |
| Constructors | | Instances | |
|
|
| data BasicJoin |
| Constructors | | Instances | |
|
|
| data Tension |
| Constructors | | Instances | |
|
|
| data Area |
| Constructors | | Instances | |
|
|
| data AreaDescr |
| Constructors | | Instances | |
|
|
| stdAreaDescr :: AreaDescr |
|
| getDefault :: Maybe a -> a -> a |
|
| data Frame |
| Constructors | | Instances | |
|
|
| data AbsOrRel |
| Constructors | | Instances | |
|
|
| data ExtentAttrib |
| Constructors | | Instances | |
|
|
| stdExtentAttrib :: ExtentAttrib |
|
| dot :: Frame |
|
| bullet :: Frame |
|
| box :: IsPicture a => a -> Frame |
|
| triangle :: IsPicture a => a -> Frame |
|
| triAngle :: IsPicture a => Numeric -> a -> Frame |
|
| rbox :: IsPicture a => Numeric -> a -> Frame |
|
| oval :: IsPicture a => a -> Frame |
|
| circle :: IsPicture a => a -> Frame |
|
| Produced by Haddock version 0.8 |