module OpenCascade.Graphic3D.VerticalTextAlignment
( VerticalTextAlignment (..)
) where

-- Should match the order in Graphic3D.HorizontalTextAlignment.hxx
data VerticalTextAlignment = Bottom | Center | Top | TopFirstLine deriving (Int -> VerticalTextAlignment
VerticalTextAlignment -> Int
VerticalTextAlignment -> [VerticalTextAlignment]
VerticalTextAlignment -> VerticalTextAlignment
VerticalTextAlignment
-> VerticalTextAlignment -> [VerticalTextAlignment]
VerticalTextAlignment
-> VerticalTextAlignment
-> VerticalTextAlignment
-> [VerticalTextAlignment]
(VerticalTextAlignment -> VerticalTextAlignment)
-> (VerticalTextAlignment -> VerticalTextAlignment)
-> (Int -> VerticalTextAlignment)
-> (VerticalTextAlignment -> Int)
-> (VerticalTextAlignment -> [VerticalTextAlignment])
-> (VerticalTextAlignment
    -> VerticalTextAlignment -> [VerticalTextAlignment])
-> (VerticalTextAlignment
    -> VerticalTextAlignment -> [VerticalTextAlignment])
-> (VerticalTextAlignment
    -> VerticalTextAlignment
    -> VerticalTextAlignment
    -> [VerticalTextAlignment])
-> Enum VerticalTextAlignment
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: VerticalTextAlignment -> VerticalTextAlignment
succ :: VerticalTextAlignment -> VerticalTextAlignment
$cpred :: VerticalTextAlignment -> VerticalTextAlignment
pred :: VerticalTextAlignment -> VerticalTextAlignment
$ctoEnum :: Int -> VerticalTextAlignment
toEnum :: Int -> VerticalTextAlignment
$cfromEnum :: VerticalTextAlignment -> Int
fromEnum :: VerticalTextAlignment -> Int
$cenumFrom :: VerticalTextAlignment -> [VerticalTextAlignment]
enumFrom :: VerticalTextAlignment -> [VerticalTextAlignment]
$cenumFromThen :: VerticalTextAlignment
-> VerticalTextAlignment -> [VerticalTextAlignment]
enumFromThen :: VerticalTextAlignment
-> VerticalTextAlignment -> [VerticalTextAlignment]
$cenumFromTo :: VerticalTextAlignment
-> VerticalTextAlignment -> [VerticalTextAlignment]
enumFromTo :: VerticalTextAlignment
-> VerticalTextAlignment -> [VerticalTextAlignment]
$cenumFromThenTo :: VerticalTextAlignment
-> VerticalTextAlignment
-> VerticalTextAlignment
-> [VerticalTextAlignment]
enumFromThenTo :: VerticalTextAlignment
-> VerticalTextAlignment
-> VerticalTextAlignment
-> [VerticalTextAlignment]
Enum, Int -> VerticalTextAlignment -> ShowS
[VerticalTextAlignment] -> ShowS
VerticalTextAlignment -> String
(Int -> VerticalTextAlignment -> ShowS)
-> (VerticalTextAlignment -> String)
-> ([VerticalTextAlignment] -> ShowS)
-> Show VerticalTextAlignment
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> VerticalTextAlignment -> ShowS
showsPrec :: Int -> VerticalTextAlignment -> ShowS
$cshow :: VerticalTextAlignment -> String
show :: VerticalTextAlignment -> String
$cshowList :: [VerticalTextAlignment] -> ShowS
showList :: [VerticalTextAlignment] -> ShowS
Show)