| Safe Haskell | Safe-Inferred | 
|---|---|
| Language | Haskell2010 | 
Text.Tabular.AsciiWide
Description
Text.Tabular.AsciiArt from tabular-0.2.2.7, modified to treat wide characters as double width.
Synopsis
- module Text.Tabular
 - data TableOpts = TableOpts {
- prettyTable :: Bool
 - tableBorders :: Bool
 - borderSpaces :: Bool
 
 - render :: Bool -> (rh -> Text) -> (ch -> Text) -> (a -> Text) -> Table rh ch a -> Text
 - renderTable :: TableOpts -> (rh -> Cell) -> (ch -> Cell) -> (a -> Cell) -> Table rh ch a -> Text
 - renderTableB :: TableOpts -> (rh -> Cell) -> (ch -> Cell) -> (a -> Cell) -> Table rh ch a -> Builder
 - renderTableByRowsB :: TableOpts -> ([ch] -> [Cell]) -> ((rh, [a]) -> (Cell, [Cell])) -> Table rh ch a -> Builder
 - renderRow :: TableOpts -> Header Cell -> Text
 - renderRowB :: TableOpts -> Header Cell -> Builder
 - renderColumns :: TableOpts -> [Int] -> Header Cell -> Builder
 - data Cell = Cell Align [WideBuilder]
 - data Align
 - emptyCell :: Cell
 - textCell :: Align -> Text -> Cell
 - textsCell :: Align -> [Text] -> Cell
 - cellWidth :: Cell -> Int
 - concatTables :: Properties -> Table rh ch a -> Table rh ch2 a -> Table rh ch a
 
Documentation
module Text.Tabular
The options to use for rendering a table.
Constructors
| TableOpts | |
Fields 
  | |
render :: Bool -> (rh -> Text) -> (ch -> Text) -> (a -> Text) -> Table rh ch a -> Text Source #
Render a table according to common options, for backwards compatibility
Arguments
| :: TableOpts | Options controlling Table rendering  | 
| -> (rh -> Cell) | Rendering function for row headers  | 
| -> (ch -> Cell) | Rendering function for column headers  | 
| -> (a -> Cell) | Function determining the string and width of a cell  | 
| -> Table rh ch a | |
| -> Text | 
Render a table according to various cell specifications>
Arguments
| :: TableOpts | Options controlling Table rendering  | 
| -> (rh -> Cell) | Rendering function for row headers  | 
| -> (ch -> Cell) | Rendering function for column headers  | 
| -> (a -> Cell) | Function determining the string and width of a cell  | 
| -> Table rh ch a | |
| -> Builder | 
A version of renderTable which returns the underlying Builder.
Arguments
| :: TableOpts | Options controlling Table rendering  | 
| -> ([ch] -> [Cell]) | Rendering function for column headers  | 
| -> ((rh, [a]) -> (Cell, [Cell])) | Rendering function for row and row header  | 
| -> Table rh ch a | |
| -> Builder | 
A version of renderTable that operates on rows (including the row of
 column headers) and returns the underlying Builder.
renderRow :: TableOpts -> Header Cell -> Text Source #
Render a single row according to cell specifications.
renderRowB :: TableOpts -> Header Cell -> Builder Source #
A version of renderRow which returns the underlying Builder.
Arguments
| :: TableOpts | rendering options for the table  | 
| -> [Int] | max width for each column  | 
| -> Header Cell | |
| -> Builder | 
We stop rendering on the shortest list!
How to align text in a cell
Constructors
| TopRight | |
| BottomRight | |
| BottomLeft | |
| TopLeft | 
textCell :: Align -> Text -> Cell Source #
Create a single-line cell from the given contents with its natural width.
textsCell :: Align -> [Text] -> Cell Source #
Create a multi-line cell from the given contents with its natural width.
concatTables :: Properties -> Table rh ch a -> Table rh ch2 a -> Table rh ch a Source #
Add the second table below the first, discarding its column headings.