{-# LANGUAGE DeriveDataTypeable #-}
module Language.Javascript.Flot(
Flot(..), version, file
) where
import qualified Paths_js_flot as Paths
import Data.Version
import Data.Data
import Data.Char
data Flot
= Flot
| FlotCanvas
| FlotCategories
| FlotCrosshair
| FlotErrorbars
| FlotFillbetween
| FlotImage
| FlotNavigate
| FlotPie
| FlotResize
| FlotSelection
| FlotStack
| FlotSymbol
| FlotThreshold
| FlotTime
deriving (Flot -> Flot -> Bool
(Flot -> Flot -> Bool) -> (Flot -> Flot -> Bool) -> Eq Flot
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Flot -> Flot -> Bool
$c/= :: Flot -> Flot -> Bool
== :: Flot -> Flot -> Bool
$c== :: Flot -> Flot -> Bool
Eq,Eq Flot
Eq Flot =>
(Flot -> Flot -> Ordering)
-> (Flot -> Flot -> Bool)
-> (Flot -> Flot -> Bool)
-> (Flot -> Flot -> Bool)
-> (Flot -> Flot -> Bool)
-> (Flot -> Flot -> Flot)
-> (Flot -> Flot -> Flot)
-> Ord Flot
Flot -> Flot -> Bool
Flot -> Flot -> Ordering
Flot -> Flot -> Flot
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: Flot -> Flot -> Flot
$cmin :: Flot -> Flot -> Flot
max :: Flot -> Flot -> Flot
$cmax :: Flot -> Flot -> Flot
>= :: Flot -> Flot -> Bool
$c>= :: Flot -> Flot -> Bool
> :: Flot -> Flot -> Bool
$c> :: Flot -> Flot -> Bool
<= :: Flot -> Flot -> Bool
$c<= :: Flot -> Flot -> Bool
< :: Flot -> Flot -> Bool
$c< :: Flot -> Flot -> Bool
compare :: Flot -> Flot -> Ordering
$ccompare :: Flot -> Flot -> Ordering
$cp1Ord :: Eq Flot
Ord,Int -> Flot -> ShowS
[Flot] -> ShowS
Flot -> String
(Int -> Flot -> ShowS)
-> (Flot -> String) -> ([Flot] -> ShowS) -> Show Flot
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Flot] -> ShowS
$cshowList :: [Flot] -> ShowS
show :: Flot -> String
$cshow :: Flot -> String
showsPrec :: Int -> Flot -> ShowS
$cshowsPrec :: Int -> Flot -> ShowS
Show,ReadPrec [Flot]
ReadPrec Flot
Int -> ReadS Flot
ReadS [Flot]
(Int -> ReadS Flot)
-> ReadS [Flot] -> ReadPrec Flot -> ReadPrec [Flot] -> Read Flot
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [Flot]
$creadListPrec :: ReadPrec [Flot]
readPrec :: ReadPrec Flot
$creadPrec :: ReadPrec Flot
readList :: ReadS [Flot]
$creadList :: ReadS [Flot]
readsPrec :: Int -> ReadS Flot
$creadsPrec :: Int -> ReadS Flot
Read,Flot
Flot -> Flot -> Bounded Flot
forall a. a -> a -> Bounded a
maxBound :: Flot
$cmaxBound :: Flot
minBound :: Flot
$cminBound :: Flot
Bounded,Int -> Flot
Flot -> Int
Flot -> [Flot]
Flot -> Flot
Flot -> Flot -> [Flot]
Flot -> Flot -> Flot -> [Flot]
(Flot -> Flot)
-> (Flot -> Flot)
-> (Int -> Flot)
-> (Flot -> Int)
-> (Flot -> [Flot])
-> (Flot -> Flot -> [Flot])
-> (Flot -> Flot -> [Flot])
-> (Flot -> Flot -> Flot -> [Flot])
-> Enum Flot
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
enumFromThenTo :: Flot -> Flot -> Flot -> [Flot]
$cenumFromThenTo :: Flot -> Flot -> Flot -> [Flot]
enumFromTo :: Flot -> Flot -> [Flot]
$cenumFromTo :: Flot -> Flot -> [Flot]
enumFromThen :: Flot -> Flot -> [Flot]
$cenumFromThen :: Flot -> Flot -> [Flot]
enumFrom :: Flot -> [Flot]
$cenumFrom :: Flot -> [Flot]
fromEnum :: Flot -> Int
$cfromEnum :: Flot -> Int
toEnum :: Int -> Flot
$ctoEnum :: Int -> Flot
pred :: Flot -> Flot
$cpred :: Flot -> Flot
succ :: Flot -> Flot
$csucc :: Flot -> Flot
Enum,Typeable Flot
Constr
DataType
Typeable Flot =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Flot -> c Flot)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Flot)
-> (Flot -> Constr)
-> (Flot -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Flot))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Flot))
-> ((forall b. Data b => b -> b) -> Flot -> Flot)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Flot -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Flot -> r)
-> (forall u. (forall d. Data d => d -> u) -> Flot -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> Flot -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Flot -> m Flot)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Flot -> m Flot)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Flot -> m Flot)
-> Data Flot
Flot -> Constr
Flot -> DataType
(forall b. Data b => b -> b) -> Flot -> Flot
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Flot -> c Flot
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Flot
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u. Int -> (forall d. Data d => d -> u) -> Flot -> u
forall u. (forall d. Data d => d -> u) -> Flot -> [u]
forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Flot -> r
forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Flot -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Flot -> m Flot
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Flot -> m Flot
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Flot
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Flot -> c Flot
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Flot)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Flot)
$cFlotTime :: Constr
$cFlotThreshold :: Constr
$cFlotSymbol :: Constr
$cFlotStack :: Constr
$cFlotSelection :: Constr
$cFlotResize :: Constr
$cFlotPie :: Constr
$cFlotNavigate :: Constr
$cFlotImage :: Constr
$cFlotFillbetween :: Constr
$cFlotErrorbars :: Constr
$cFlotCrosshair :: Constr
$cFlotCategories :: Constr
$cFlotCanvas :: Constr
$cFlot :: Constr
$tFlot :: DataType
gmapMo :: (forall d. Data d => d -> m d) -> Flot -> m Flot
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Flot -> m Flot
gmapMp :: (forall d. Data d => d -> m d) -> Flot -> m Flot
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Flot -> m Flot
gmapM :: (forall d. Data d => d -> m d) -> Flot -> m Flot
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Flot -> m Flot
gmapQi :: Int -> (forall d. Data d => d -> u) -> Flot -> u
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> Flot -> u
gmapQ :: (forall d. Data d => d -> u) -> Flot -> [u]
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> Flot -> [u]
gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Flot -> r
$cgmapQr :: forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Flot -> r
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Flot -> r
$cgmapQl :: forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Flot -> r
gmapT :: (forall b. Data b => b -> b) -> Flot -> Flot
$cgmapT :: (forall b. Data b => b -> b) -> Flot -> Flot
dataCast2 :: (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Flot)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Flot)
dataCast1 :: (forall d. Data d => c (t d)) -> Maybe (c Flot)
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Flot)
dataTypeOf :: Flot -> DataType
$cdataTypeOf :: Flot -> DataType
toConstr :: Flot -> Constr
$ctoConstr :: Flot -> Constr
gunfold :: (forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Flot
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Flot
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Flot -> c Flot
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Flot -> c Flot
$cp1Data :: Typeable Flot
Data,Typeable)
file :: Flot -> IO FilePath
file :: Flot -> IO String
file = String -> IO String
Paths.getDataFileName (String -> IO String) -> (Flot -> String) -> Flot -> IO String
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Flot -> String
name
name :: Flot -> String
name Flot = "jquery.flot.min.js"
name x :: Flot
x = "jquery.flot." String -> ShowS
forall a. [a] -> [a] -> [a]
++ (Char -> Char) -> ShowS
forall a b. (a -> b) -> [a] -> [b]
map Char -> Char
toLower (Int -> ShowS
forall a. Int -> [a] -> [a]
drop 4 ShowS -> ShowS
forall a b. (a -> b) -> a -> b
$ Flot -> String
forall a. Show a => a -> String
show Flot
x) String -> ShowS
forall a. [a] -> [a] -> [a]
++ ".min.js"
version :: Version
version :: Version
version = [Int] -> [String] -> Version
Version (Int -> [Int] -> [Int]
forall a. Int -> [a] -> [a]
take 3 ([Int] -> [Int]) -> [Int] -> [Int]
forall a b. (a -> b) -> a -> b
$ Version -> [Int]
versionBranch Version
Paths.version) []