lucid-extras-0.2.2: Generate more HTML with Lucid - Bootstrap, Rdash, Vega-Lite, Leaflet JS, Email.

Safe HaskellNone
LanguageHaskell2010

Lucid.Tables

Documentation

class ToHtmlTable a where Source #

Minimal complete definition

Nothing

Methods

headers :: Proxy a -> [Text] Source #

headers :: (Generic a, TableSelectors (Rep a)) => Proxy a -> [Text] Source #

toHtmlRow :: Monad m => a -> [HtmlT m ()] Source #

toHtmlRow :: (Monad m, Generic a, GToTable (Rep a)) => a -> [HtmlT m ()] Source #

class GToTable f where Source #

Methods

gtoHtmlRow :: Monad m => f a -> [HtmlT m ()] Source #

Instances
GToTable (U1 :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

gtoHtmlRow :: Monad m => U1 a -> [HtmlT m ()] Source #

(GToTable a, GToTable b) => GToTable (a :*: b :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

gtoHtmlRow :: Monad m => (a :*: b) a0 -> [HtmlT m ()] Source #

(Selector d, ToHtml a) => GToTable (M1 S d (K1 R a :: k -> Type) :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

gtoHtmlRow :: Monad m => M1 S d (K1 R a) a0 -> [HtmlT m ()] Source #

GToTable a => GToTable (M1 D c a :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

gtoHtmlRow :: Monad m => M1 D c a a0 -> [HtmlT m ()] Source #

GToTable a => GToTable (M1 C c a :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

gtoHtmlRow :: Monad m => M1 C c a a0 -> [HtmlT m ()] Source #

class TableSelectors a where Source #

Methods

selNames :: Proxy a -> [String] Source #

Instances
TableSelectors (U1 :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

selNames :: Proxy U1 -> [String] Source #

(TableSelectors a, TableSelectors b) => TableSelectors (a :*: b :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

selNames :: Proxy (a :*: b) -> [String] Source #

Selector s => TableSelectors (M1 S s (K1 R t :: k -> Type) :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

selNames :: Proxy (M1 S s (K1 R t)) -> [String] Source #

TableSelectors f => TableSelectors (M1 C x f :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

selNames :: Proxy (M1 C x f) -> [String] Source #

TableSelectors f => TableSelectors (M1 D x f :: k -> Type) Source # 
Instance details

Defined in Lucid.Tables

Methods

selNames :: Proxy (M1 D x f) -> [String] Source #