module Text.Layout.Table.Internal where
import Data.Default.Class
import Data.Default.Instances.Base
import Text.Layout.Table.Position
import Text.Layout.Table.Primitives.Basic
newtype RowGroup
= RowGroup
{ rows :: [[String]]
}
rowsG :: [Row String] -> RowGroup
rowsG = RowGroup
rowG :: Row String -> RowGroup
rowG = RowGroup . (: [])
data HeaderColSpec = HeaderColSpec (Position H) (Maybe CutMark)
headerColumn :: Position H -> Maybe CutMark -> HeaderColSpec
headerColumn = HeaderColSpec
instance Default HeaderColSpec where
def = headerColumn center def
type Row a = [a]
type Col a = [a]