xlsx-0.8.4: Simple and incomplete Excel file parser/writer
Safe HaskellNone
LanguageHaskell2010

Codec.Xlsx.Types.StyleSheet

Description

Support for writing (but not reading) style sheets

Synopsis

The main two types

data StyleSheet Source #

StyleSheet for an XML document

Relevant parts of the EMCA standard (4th edition, part 1, http://www.ecma-international.org/publications/standards/Ecma-376.htm), page numbers refer to the page in the PDF rather than the page number as printed on the page):

  • Chapter 12, "SpreadsheetML" (p. 74) In particular Section 12.3.20, "Styles Part" (p. 104)
  • Chapter 18, "SpreadsheetML Reference Material" (p. 1528) In particular Section 18.8, "Styles" (p. 1754) and Section 18.8.39 "styleSheet" (Style Sheet)" (p. 1796); it is the latter section that specifies the top-level style sheet format.

TODO: the following child elements:

  • cellStyles
  • cellStyleXfs
  • colors
  • extLst
  • tableStyles

NOTE: Because of undocumented Excel requirements you will probably want to base your style sheet on minimalStyleSheet (a proper style sheet should have some contents for details see SO post). def for StyleSheet includes no contents at all and this could be a problem for Excel.

See also:

Constructors

StyleSheet 

Fields

  • _styleSheetBorders :: [Border]

    This element contains borders formatting information, specifying all border definitions for all cells in the workbook.

    Section 18.8.5, "borders (Borders)" (p. 1760)

  • _styleSheetCellXfs :: [CellXf]

    Cell formats

    This element contains the master formatting records (xf) which define the formatting applied to cells in this workbook. These records are the starting point for determining the formatting for a cell. Cells in the Sheet Part reference the xf records by zero-based index.

    Section 18.8.10, "cellXfs (Cell Formats)" (p. 1764)

  • _styleSheetFills :: [Fill]

    This element defines the cell fills portion of the Styles part, consisting of a sequence of fill records. A cell fill consists of a background color, foreground color, and pattern to be applied across the cell.

    Section 18.8.21, "fills (Fills)" (p. 1768)

  • _styleSheetFonts :: [Font]

    This element contains all font definitions for this workbook.

    Section 18.8.23 "fonts (Fonts)" (p. 1769)

  • _styleSheetDxfs :: [Dxf]

    Differential formatting

    This element contains the master differential formatting records (dxf's) which define formatting for all non-cell formatting in this workbook. Whereas xf records fully specify a particular aspect of formatting (e.g., cell borders) by referencing those formatting definitions elsewhere in the Styles part, dxf records specify incremental (or differential) aspects of formatting directly inline within the dxf element. The dxf formatting is to be applied on top of or in addition to any formatting already present on the object using the dxf record.

    Section 18.8.15, "dxfs (Formats)" (p. 1765)

  • _styleSheetNumFmts :: Map Int FormatCode

    Number formats

    This element contains custom number formats defined in this style sheet

    Section 18.8.31, "numFmts (Number Formats)" (p. 1784)

Instances

Instances details
Eq StyleSheet Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord StyleSheet Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show StyleSheet Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic StyleSheet Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep StyleSheet :: Type -> Type #

Default StyleSheet Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: StyleSheet #

NFData StyleSheet Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: StyleSheet -> () #

FromCursor StyleSheet Source #

See CT_Stylesheet, p. 4482

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToElement StyleSheet Source #

See CT_Stylesheet, p. 4482

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToDocument StyleSheet Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep StyleSheet Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep StyleSheet = D1 ('MetaData "StyleSheet" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "StyleSheet" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_styleSheetBorders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Border]) :*: (S1 ('MetaSel ('Just "_styleSheetCellXfs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [CellXf]) :*: S1 ('MetaSel ('Just "_styleSheetFills") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Fill]))) :*: (S1 ('MetaSel ('Just "_styleSheetFonts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Font]) :*: (S1 ('MetaSel ('Just "_styleSheetDxfs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dxf]) :*: S1 ('MetaSel ('Just "_styleSheetNumFmts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Int FormatCode))))))

data CellXf Source #

Cell formatting

TODO: The extLst field is currently unsupported.

Section 18.8.45 "xf (Format)" (p. 1800)

Constructors

CellXf 

Fields

  • _cellXfApplyAlignment :: Maybe Bool

    A boolean value indicating whether the alignment formatting specified for this xf should be applied.

  • _cellXfApplyBorder :: Maybe Bool

    A boolean value indicating whether the border formatting specified for this xf should be applied.

  • _cellXfApplyFill :: Maybe Bool

    A boolean value indicating whether the fill formatting specified for this xf should be applied.

  • _cellXfApplyFont :: Maybe Bool

    A boolean value indicating whether the font formatting specified for this xf should be applied.

  • _cellXfApplyNumberFormat :: Maybe Bool

    A boolean value indicating whether the number formatting specified for this xf should be applied.

  • _cellXfApplyProtection :: Maybe Bool

    A boolean value indicating whether the protection formatting specified for this xf should be applied.

  • _cellXfBorderId :: Maybe Int

    Zero-based index of the border record used by this cell format.

    (18.18.2, p. 2437).

  • _cellXfFillId :: Maybe Int

    Zero-based index of the fill record used by this cell format.

    (18.18.30, p. 2455)

  • _cellXfFontId :: Maybe Int

    Zero-based index of the font record used by this cell format.

    An integer that represents a zero based index into the styleSheetFonts collection in the style sheet (18.18.32, p. 2456).

  • _cellXfNumFmtId :: Maybe Int

    Id of the number format (numFmt) record used by this cell format.

    This simple type defines the identifier to a style sheet number format entry in CT_NumFmts. Number formats are written to the styles part (18.18.47, p. 2468). See also 18.8.31 (p. 1784) for more information on number formats.

  • _cellXfPivotButton :: Maybe Bool

    A boolean value indicating whether the cell rendering includes a pivot table dropdown button.

  • _cellXfQuotePrefix :: Maybe Bool

    A boolean value indicating whether the text string in a cell should be prefixed by a single quote mark (e.g., 'text). In these cases, the quote is not stored in the Shared Strings Part.

  • _cellXfId :: Maybe Int

    For xf records contained in cellXfs this is the zero-based index of an xf record contained in cellStyleXfs corresponding to the cell style applied to the cell.

    Not present for xf records contained in cellStyleXfs.

    Used by xf records and cellStyle records to reference xf records defined in the cellStyleXfs collection. (18.18.10, p. 2442) TODO: the cellStyleXfs field of a style sheet not currently implemented.

  • _cellXfAlignment :: Maybe Alignment

    Formatting information pertaining to text alignment in cells. There are a variety of choices for how text is aligned both horizontally and vertically, as well as indentation settings, and so on.

  • _cellXfProtection :: Maybe Protection

    Contains protection properties associated with the cell. Each cell has protection properties that can be set. The cell protection properties do not take effect unless the sheet has been protected.

Instances

Instances details
Eq CellXf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

(==) :: CellXf -> CellXf -> Bool #

(/=) :: CellXf -> CellXf -> Bool #

Ord CellXf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show CellXf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic CellXf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep CellXf :: Type -> Type #

Methods

from :: CellXf -> Rep CellXf x #

to :: Rep CellXf x -> CellXf #

Default CellXf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: CellXf #

NFData CellXf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: CellXf -> () #

FromCursor CellXf Source #

See CT_Xf, p. 4486

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToElement CellXf Source #

See CT_Xf, p. 4486

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep CellXf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep CellXf = D1 ('MetaData "CellXf" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "CellXf" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_cellXfApplyAlignment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: (S1 ('MetaSel ('Just "_cellXfApplyBorder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_cellXfApplyFill") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))) :*: ((S1 ('MetaSel ('Just "_cellXfApplyFont") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_cellXfApplyNumberFormat") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))) :*: (S1 ('MetaSel ('Just "_cellXfApplyProtection") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_cellXfBorderId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))))) :*: (((S1 ('MetaSel ('Just "_cellXfFillId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "_cellXfFontId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :*: (S1 ('MetaSel ('Just "_cellXfNumFmtId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "_cellXfPivotButton") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))) :*: ((S1 ('MetaSel ('Just "_cellXfQuotePrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_cellXfId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :*: (S1 ('MetaSel ('Just "_cellXfAlignment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Alignment)) :*: S1 ('MetaSel ('Just "_cellXfProtection") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Protection)))))))

minimalStyleSheet :: StyleSheet Source #

Minimal style sheet

Excel expects some minimal definitions in the stylesheet; you probably want to define your own stylesheets based on this one.

This more-or-less follows the recommendations at http://stackoverflow.com/questions/26050708/minimal-style-sheet-for-excel-open-xml-with-dates, but with some additions based on experimental evidence.

Supporting record types

data Alignment Source #

Alignment

See 18.8.1 "alignment (Alignment)" (p. 1754)

Constructors

Alignment 

Fields

Instances

Instances details
Eq Alignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord Alignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show Alignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic Alignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep Alignment :: Type -> Type #

Default Alignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: Alignment #

NFData Alignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: Alignment -> () #

FromCursor Alignment Source #

See CT_CellAlignment, p. 4482

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToElement Alignment Source #

See CT_CellAlignment, p. 4482

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Alignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Alignment = D1 ('MetaData "Alignment" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "Alignment" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_alignmentHorizontal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe CellHorizontalAlignment)) :*: S1 ('MetaSel ('Just "_alignmentIndent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :*: (S1 ('MetaSel ('Just "_alignmentJustifyLastLine") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_alignmentReadingOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ReadingOrder)))) :*: ((S1 ('MetaSel ('Just "_alignmentRelativeIndent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "_alignmentShrinkToFit") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))) :*: (S1 ('MetaSel ('Just "_alignmentTextRotation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: (S1 ('MetaSel ('Just "_alignmentVertical") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe CellVerticalAlignment)) :*: S1 ('MetaSel ('Just "_alignmentWrapText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))))))

data Border Source #

Expresses a single set of cell border formats (left, right, top, bottom, diagonal). Color is optional. When missing, automatic is implied.

See 18.8.4 "border (Border)" (p. 1759)

Constructors

Border 

Fields

Instances

Instances details
Eq Border Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

(==) :: Border -> Border -> Bool #

(/=) :: Border -> Border -> Bool #

Ord Border Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show Border Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic Border Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep Border :: Type -> Type #

Methods

from :: Border -> Rep Border x #

to :: Rep Border x -> Border #

Default Border Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: Border #

NFData Border Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: Border -> () #

FromCursor Border Source #

See CT_Border, p. 4483

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToElement Border Source #

See CT_Border, p. 4483

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Border Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Border = D1 ('MetaData "Border" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "Border" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_borderDiagonalDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: (S1 ('MetaSel ('Just "_borderDiagonalUp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_borderOutline") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))) :*: (S1 ('MetaSel ('Just "_borderBottom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle)) :*: (S1 ('MetaSel ('Just "_borderDiagonal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle)) :*: S1 ('MetaSel ('Just "_borderEnd") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle))))) :*: ((S1 ('MetaSel ('Just "_borderHorizontal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle)) :*: (S1 ('MetaSel ('Just "_borderLeft") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle)) :*: S1 ('MetaSel ('Just "_borderRight") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle)))) :*: (S1 ('MetaSel ('Just "_borderStart") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle)) :*: (S1 ('MetaSel ('Just "_borderTop") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle)) :*: S1 ('MetaSel ('Just "_borderVertical") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BorderStyle)))))))

data BorderStyle Source #

Border style See CT_BorderPr (p. 3934)

Instances

Instances details
Eq BorderStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord BorderStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show BorderStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic BorderStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep BorderStyle :: Type -> Type #

Default BorderStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: BorderStyle #

NFData BorderStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: BorderStyle -> () #

FromCursor BorderStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToElement BorderStyle Source #

See CT_BorderPr, p. 4483

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep BorderStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep BorderStyle = D1 ('MetaData "BorderStyle" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "BorderStyle" 'PrefixI 'True) (S1 ('MetaSel ('Just "_borderStyleColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Color)) :*: S1 ('MetaSel ('Just "_borderStyleLine") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe LineStyle))))

data Color Source #

One of the colors associated with the data bar or color scale.

The indexed attribute (used for backwards compatibility only) is not modelled here.

See 18.3.1.15 "color (Data Bar Color)" (p. 1608)

Constructors

Color 

Fields

  • _colorAutomatic :: Maybe Bool

    A boolean value indicating the color is automatic and system color dependent.

  • _colorARGB :: Maybe Text

    Standard Alpha Red Green Blue color value (ARGB).

    This simple type's contents have a length of exactly 8 hexadecimal digit(s); see "18.18.86 ST_UnsignedIntHex (Hex Unsigned Integer)" (p. 2511).

  • _colorTheme :: Maybe Int

    A zero-based index into the clrScheme collection (20.1.6.2), referencing a particular sysClr or srgbClr value expressed in the Theme part.

  • _colorTint :: Maybe Double

    Specifies the tint value applied to the color.

    If tint is supplied, then it is applied to the RGB value of the color to determine the final color applied.

    The tint value is stored as a double from -1.0 .. 1.0, where -1.0 means 100% darken and 1.0 means 100% lighten. Also, 0.0 means no change.

Instances

Instances details
Eq Color Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

(==) :: Color -> Color -> Bool #

(/=) :: Color -> Color -> Bool #

Ord Color Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

compare :: Color -> Color -> Ordering #

(<) :: Color -> Color -> Bool #

(<=) :: Color -> Color -> Bool #

(>) :: Color -> Color -> Bool #

(>=) :: Color -> Color -> Bool #

max :: Color -> Color -> Color #

min :: Color -> Color -> Color #

Show Color Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

Generic Color Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep Color :: Type -> Type #

Methods

from :: Color -> Rep Color x #

to :: Rep Color x -> Color #

Default Color Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: Color #

NFData Color Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: Color -> () #

FromXenoNode Color Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

FromCursor Color Source #

See CT_Color, p. 4484

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

fromCursor :: Cursor -> [Color] Source #

ToElement Color Source #

See CT_Color, p. 4484

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Color Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Color = D1 ('MetaData "Color" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "Color" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_colorAutomatic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_colorARGB") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "_colorTheme") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "_colorTint") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Double)))))

data Dxf Source #

A single dxf record, expressing incremental formatting to be applied.

Section 18.8.14, "dxf (Formatting)" (p. 1765)

Constructors

Dxf 

Fields

Instances

Instances details
Eq Dxf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

(==) :: Dxf -> Dxf -> Bool #

(/=) :: Dxf -> Dxf -> Bool #

Ord Dxf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

compare :: Dxf -> Dxf -> Ordering #

(<) :: Dxf -> Dxf -> Bool #

(<=) :: Dxf -> Dxf -> Bool #

(>) :: Dxf -> Dxf -> Bool #

(>=) :: Dxf -> Dxf -> Bool #

max :: Dxf -> Dxf -> Dxf #

min :: Dxf -> Dxf -> Dxf #

Show Dxf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

showsPrec :: Int -> Dxf -> ShowS #

show :: Dxf -> String #

showList :: [Dxf] -> ShowS #

Generic Dxf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep Dxf :: Type -> Type #

Methods

from :: Dxf -> Rep Dxf x #

to :: Rep Dxf x -> Dxf #

Default Dxf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: Dxf #

NFData Dxf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: Dxf -> () #

FromCursor Dxf Source #

See CT_Dxf, p. 3937

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

fromCursor :: Cursor -> [Dxf] Source #

ToElement Dxf Source #

See CT_Dxf, p. 3937

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

toElement :: Name -> Dxf -> Element Source #

type Rep Dxf Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

data Fill Source #

This element specifies fill formatting.

TODO: Gradient fills (18.8.4) are currently unsupported. If we add them, then the spec says (CT_Fill, p. 3935), _either_ a gradient _or_ a solid fill pattern should be specified.

Section 18.8.20, "fill (Fill)" (p. 1768)

Constructors

Fill 

Instances

Instances details
Eq Fill Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

(==) :: Fill -> Fill -> Bool #

(/=) :: Fill -> Fill -> Bool #

Ord Fill Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

compare :: Fill -> Fill -> Ordering #

(<) :: Fill -> Fill -> Bool #

(<=) :: Fill -> Fill -> Bool #

(>) :: Fill -> Fill -> Bool #

(>=) :: Fill -> Fill -> Bool #

max :: Fill -> Fill -> Fill #

min :: Fill -> Fill -> Fill #

Show Fill Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

showsPrec :: Int -> Fill -> ShowS #

show :: Fill -> String #

showList :: [Fill] -> ShowS #

Generic Fill Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep Fill :: Type -> Type #

Methods

from :: Fill -> Rep Fill x #

to :: Rep Fill x -> Fill #

Default Fill Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: Fill #

NFData Fill Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: Fill -> () #

FromCursor Fill Source #

See CT_Fill, p. 4484

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

fromCursor :: Cursor -> [Fill] Source #

ToElement Fill Source #

See CT_Fill, p. 4484

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

toElement :: Name -> Fill -> Element Source #

type Rep Fill Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Fill = D1 ('MetaData "Fill" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "Fill" 'PrefixI 'True) (S1 ('MetaSel ('Just "_fillPattern") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FillPattern))))

data FillPattern Source #

This element is used to specify cell fill information for pattern and solid color cell fills. For solid cell fills (no pattern), fgColor is used. For cell fills with patterns specified, then the cell fill color is specified by the bgColor element.

Section 18.8.32 "patternFill (Pattern)" (p. 1793)

Instances

Instances details
Eq FillPattern Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord FillPattern Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show FillPattern Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic FillPattern Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep FillPattern :: Type -> Type #

Default FillPattern Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: FillPattern #

NFData FillPattern Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: FillPattern -> () #

FromCursor FillPattern Source #

See CT_PatternFill, p. 4484

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToElement FillPattern Source #

See CT_PatternFill, p. 4484

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FillPattern Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FillPattern = D1 ('MetaData "FillPattern" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "FillPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "_fillPatternBgColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Color)) :*: (S1 ('MetaSel ('Just "_fillPatternFgColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Color)) :*: S1 ('MetaSel ('Just "_fillPatternType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe PatternType)))))

data Font Source #

This element defines the properties for one of the fonts used in this workbook.

Section 18.2.22 "font (Font)" (p. 1769)

Constructors

Font 

Fields

  • _fontBold :: Maybe Bool

    Displays characters in bold face font style.

  • _fontCharset :: Maybe Int

    This element defines the font character set of this font.

    This field is used in font creation and selection if a font of the given facename is not available on the system. Although it is not required to have around when resolving font facename, the information can be stored for when needed to help resolve which font face to use of all available fonts on a system.

    Charset represents the basic set of characters associated with a font (that it can display), and roughly corresponds to the ANSI codepage (8-bit or DBCS) of that character set used by a given language. Given more common use of Unicode where many fonts support more than one of the traditional charset categories, and the use of font linking, using charset to resolve font name is less and less common, but still can be useful.

    These are operating-system-dependent values.

    Section 18.4.1 "charset (Character Set)" provides some example values.

  • _fontColor :: Maybe Color

    Color

  • _fontCondense :: Maybe Bool

    Macintosh compatibility setting. Represents special word/character rendering on Macintosh, when this flag is set. The effect is to condense the text (squeeze it together). SpreadsheetML applications are not required to render according to this flag.

  • _fontExtend :: Maybe Bool

    This element specifies a compatibility setting used for previous spreadsheet applications, resulting in special word/character rendering on those legacy applications, when this flag is set. The effect extends or stretches out the text. SpreadsheetML applications are not required to render according to this flag.

  • _fontFamily :: Maybe FontFamily

    The font family this font belongs to. A font family is a set of fonts having common stroke width and serif characteristics. This is system level font information. The font name overrides when there are conflicting values.

  • _fontItalic :: Maybe Bool

    Displays characters in italic font style. The italic style is defined by the font at a system level and is not specified by ECMA-376.

  • _fontName :: Maybe Text

    This element specifies the face name of this font.

    A string representing the name of the font. If the font doesn't exist (because it isn't installed on the system), or the charset not supported by that font, then another font should be substituted.

    The string length for this attribute shall be 0 to 31 characters.

  • _fontOutline :: Maybe Bool

    This element displays only the inner and outer borders of each character. This is very similar to Bold in behavior.

  • _fontScheme :: Maybe FontScheme

    Defines the font scheme, if any, to which this font belongs. When a font definition is part of a theme definition, then the font is categorized as either a major or minor font scheme component. When a new theme is chosen, every font that is part of a theme definition is updated to use the new major or minor font definition for that theme. Usually major fonts are used for styles like headings, and minor fonts are used for body and paragraph text.

  • _fontShadow :: Maybe Bool

    Macintosh compatibility setting. Represents special word/character rendering on Macintosh, when this flag is set. The effect is to render a shadow behind, beneath and to the right of the text. SpreadsheetML applications are not required to render according to this flag.

  • _fontStrikeThrough :: Maybe Bool

    This element draws a strikethrough line through the horizontal middle of the text.

  • _fontSize :: Maybe Double

    This element represents the point size (1/72 of an inch) of the Latin and East Asian text.

  • _fontUnderline :: Maybe FontUnderline

    This element represents the underline formatting style.

  • _fontVertAlign :: Maybe FontVerticalAlignment

    This element adjusts the vertical position of the text relative to the text's default appearance for this run. It is used to get superscript or subscript texts, and shall reduce the font size (if a smaller size is available) accordingly.

Instances

Instances details
Eq Font Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

(==) :: Font -> Font -> Bool #

(/=) :: Font -> Font -> Bool #

Ord Font Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

compare :: Font -> Font -> Ordering #

(<) :: Font -> Font -> Bool #

(<=) :: Font -> Font -> Bool #

(>) :: Font -> Font -> Bool #

(>=) :: Font -> Font -> Bool #

max :: Font -> Font -> Font #

min :: Font -> Font -> Font #

Show Font Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

showsPrec :: Int -> Font -> ShowS #

show :: Font -> String #

showList :: [Font] -> ShowS #

Generic Font Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep Font :: Type -> Type #

Methods

from :: Font -> Rep Font x #

to :: Rep Font x -> Font #

Default Font Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: Font #

NFData Font Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: Font -> () #

FromCursor Font Source #

See CT_Font, p. 4489

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

fromCursor :: Cursor -> [Font] Source #

ToElement Font Source #

See CT_Font, p. 4489

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

toElement :: Name -> Font -> Element Source #

type Rep Font Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Font = D1 ('MetaData "Font" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "Font" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_fontBold") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: (S1 ('MetaSel ('Just "_fontCharset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "_fontColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Color)))) :*: ((S1 ('MetaSel ('Just "_fontCondense") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_fontExtend") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))) :*: (S1 ('MetaSel ('Just "_fontFamily") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FontFamily)) :*: S1 ('MetaSel ('Just "_fontItalic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))))) :*: (((S1 ('MetaSel ('Just "_fontName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "_fontOutline") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))) :*: (S1 ('MetaSel ('Just "_fontScheme") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FontScheme)) :*: S1 ('MetaSel ('Just "_fontShadow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)))) :*: ((S1 ('MetaSel ('Just "_fontStrikeThrough") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_fontSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Double))) :*: (S1 ('MetaSel ('Just "_fontUnderline") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FontUnderline)) :*: S1 ('MetaSel ('Just "_fontVertAlign") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FontVerticalAlignment)))))))

data NumberFormat Source #

This type gives a high-level version of representation of number format used in Format.

Instances

Instances details
Eq NumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord NumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show NumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic NumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep NumberFormat :: Type -> Type #

NFData NumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: NumberFormat -> () #

type Rep NumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep NumberFormat = D1 ('MetaData "NumberFormat" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "StdNumberFormat" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ImpliedNumberFormat)) :+: C1 ('MetaCons "UserNumberFormat" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FormatCode)))

data NumFmt Source #

This element specifies number format properties which indicate how to format and render the numeric value of a cell.

Section 18.8.30 "numFmt (Number Format)" (p. 1777)

Constructors

NumFmt 

Instances

Instances details
Eq NumFmt Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

(==) :: NumFmt -> NumFmt -> Bool #

(/=) :: NumFmt -> NumFmt -> Bool #

Ord NumFmt Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show NumFmt Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic NumFmt Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep NumFmt :: Type -> Type #

Methods

from :: NumFmt -> Rep NumFmt x #

to :: Rep NumFmt x -> NumFmt #

NFData NumFmt Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: NumFmt -> () #

FromCursor NumFmt Source #

See CT_NumFmt, p. 3936

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToElement NumFmt Source #

See CT_NumFmt, p. 3936

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep NumFmt Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep NumFmt = D1 ('MetaData "NumFmt" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "NumFmt" 'PrefixI 'True) (S1 ('MetaSel ('Just "_numFmtId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "_numFmtCode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FormatCode)))

data ImpliedNumberFormat Source #

Implied number formats

Note: This only implements the predefined values for 18.2.30 "All Languages", other built-in format ids (with id < firstUserNumFmtId) are stored in NfOtherBuiltin

Constructors

NfGeneral
0 General
NfZero
1 0
Nf2Decimal
2 0.00
NfMax3Decimal
3 #,##0
NfThousandSeparator2Decimal
4 #,##0.00
NfPercent
9 0%
NfPercent2Decimal
10 0.00%
NfExponent2Decimal
11 0.00E+00
NfSingleSpacedFraction
12 # ?/?
NfDoubleSpacedFraction
13 # ??/??
NfMmDdYy
14 mm-dd-yy
NfDMmmYy
15 d-mmm-yy
NfDMmm
16 d-mmm
NfMmmYy
17 mmm-yy
NfHMm12Hr
18 h:mm AM/PM
NfHMmSs12Hr
19 h:mm:ss AM/PM
NfHMm
20 h:mm
NfHMmSs
21 h:mm:ss
NfMdyHMm
22 m/d/yy h:mm
NfThousandsNegativeParens
37 #,##0 ;(#,##0)
NfThousandsNegativeRed
38 #,##0 ;[Red](#,##0)
NfThousands2DecimalNegativeParens
39 #,##0.00;(#,##0.00)
NfThousands2DecimalNegativeRed
40 #,##0.00;[Red](#,##0.00)
NfMmSs
45 mm:ss
NfOptHMmSs
46 [h]:mm:ss
NfMmSs1Decimal
47 mmss.0
NfExponent1Decimal
48 ##0.0E+0
NfTextPlaceHolder
49 @
NfOtherImplied Int

other (non local-neutral?) built-in format (id < 164)

Instances

Instances details
Eq ImpliedNumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord ImpliedNumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show ImpliedNumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic ImpliedNumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep ImpliedNumberFormat :: Type -> Type #

NFData ImpliedNumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: ImpliedNumberFormat -> () #

type Rep ImpliedNumberFormat Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep ImpliedNumberFormat = D1 ('MetaData "ImpliedNumberFormat" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) ((((C1 ('MetaCons "NfGeneral" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NfZero" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Nf2Decimal" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "NfMax3Decimal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfThousandSeparator2Decimal" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NfPercent" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfPercent2Decimal" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "NfExponent2Decimal" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NfSingleSpacedFraction" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfDoubleSpacedFraction" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "NfMmDdYy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfDMmmYy" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NfDMmm" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfMmmYy" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "NfHMm12Hr" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NfHMmSs12Hr" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfHMm" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "NfHMmSs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfMdyHMm" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NfThousandsNegativeParens" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfThousandsNegativeRed" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "NfThousands2DecimalNegativeParens" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfThousands2DecimalNegativeRed" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NfMmSs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfOptHMmSs" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "NfMmSs1Decimal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfExponent1Decimal" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NfTextPlaceHolder" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NfOtherImplied" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))))))

type FormatCode = Text Source #

A number format code.

Section 18.8.30, "numFmt (Number Format)" (p. 1777)

data Protection Source #

Protection properties

Contains protection properties associated with the cell. Each cell has protection properties that can be set. The cell protection properties do not take effect unless the sheet has been protected.

Section 18.8.33, "protection (Protection Properties)", p. 1793

Instances

Instances details
Eq Protection Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord Protection Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show Protection Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic Protection Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep Protection :: Type -> Type #

Default Protection Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

def :: Protection #

NFData Protection Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: Protection -> () #

FromCursor Protection Source #

See CT_CellProtection, p. 4484

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToElement Protection Source #

See CT_CellProtection, p. 4484

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Protection Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep Protection = D1 ('MetaData "Protection" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "Protection" 'PrefixI 'True) (S1 ('MetaSel ('Just "_protectionHidden") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "_protectionLocked") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool))))

Supporting enumerations

data CellHorizontalAlignment Source #

Horizontal alignment in cells

See 18.18.40 "ST_HorizontalAlignment (Horizontal Alignment Type)" (p. 2459)

Instances

Instances details
Eq CellHorizontalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord CellHorizontalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show CellHorizontalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic CellHorizontalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep CellHorizontalAlignment :: Type -> Type #

NFData CellHorizontalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: CellHorizontalAlignment -> () #

FromAttrVal CellHorizontalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal CellHorizontalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep CellHorizontalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep CellHorizontalAlignment = D1 ('MetaData "CellHorizontalAlignment" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (((C1 ('MetaCons "CellHorizontalAlignmentCenter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CellHorizontalAlignmentCenterContinuous" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CellHorizontalAlignmentDistributed" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CellHorizontalAlignmentFill" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "CellHorizontalAlignmentGeneral" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CellHorizontalAlignmentJustify" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CellHorizontalAlignmentLeft" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CellHorizontalAlignmentRight" 'PrefixI 'False) (U1 :: Type -> Type))))

data CellVerticalAlignment Source #

Vertical alignment in cells

See 18.18.88 "ST_VerticalAlignment (Vertical Alignment Types)" (p. 2512)

Instances

Instances details
Eq CellVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord CellVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show CellVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic CellVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep CellVerticalAlignment :: Type -> Type #

NFData CellVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: CellVerticalAlignment -> () #

FromAttrVal CellVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal CellVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep CellVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep CellVerticalAlignment = D1 ('MetaData "CellVerticalAlignment" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) ((C1 ('MetaCons "CellVerticalAlignmentBottom" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CellVerticalAlignmentCenter" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CellVerticalAlignmentDistributed" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CellVerticalAlignmentJustify" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CellVerticalAlignmentTop" 'PrefixI 'False) (U1 :: Type -> Type))))

data FontFamily Source #

Font family

See 18.8.18 "family (Font Family)" (p. 1766) and 17.18.30 "ST_FontFamily (Font Family Value)" (p. 1388)

Constructors

FontFamilyNotApplicable

Family is not applicable

FontFamilyRoman

Proportional font with serifs

FontFamilySwiss

Proportional font without serifs

FontFamilyModern

Monospace font with or without serifs

FontFamilyScript

Script font designed to mimic the appearance of handwriting

FontFamilyDecorative

Novelty font

Instances

Instances details
Eq FontFamily Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord FontFamily Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show FontFamily Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic FontFamily Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep FontFamily :: Type -> Type #

NFData FontFamily Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: FontFamily -> () #

FromAttrBs FontFamily Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

FromAttrVal FontFamily Source #

See 18.18.94 "ST_FontFamily (Font Family)" (p. 2517)

Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal FontFamily Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FontFamily Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FontFamily = D1 ('MetaData "FontFamily" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) ((C1 ('MetaCons "FontFamilyNotApplicable" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FontFamilyRoman" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FontFamilySwiss" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "FontFamilyModern" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FontFamilyScript" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FontFamilyDecorative" 'PrefixI 'False) (U1 :: Type -> Type))))

data FontScheme Source #

Font scheme

See 18.18.33 "ST_FontScheme (Font scheme Styles)" (p. 2456)

Constructors

FontSchemeMajor

This font is the major font for this theme.

FontSchemeMinor

This font is the minor font for this theme.

FontSchemeNone

This font is not a theme font.

Instances

Instances details
Eq FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep FontScheme :: Type -> Type #

NFData FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: FontScheme -> () #

FromAttrBs FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

FromAttrVal FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FontScheme Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FontScheme = D1 ('MetaData "FontScheme" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "FontSchemeMajor" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FontSchemeMinor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FontSchemeNone" 'PrefixI 'False) (U1 :: Type -> Type)))

data FontUnderline Source #

Font underline property

See 18.4.13 "u (Underline)", p 1728

Instances

Instances details
Eq FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep FontUnderline :: Type -> Type #

NFData FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: FontUnderline -> () #

FromAttrBs FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

FromAttrVal FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FontUnderline Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FontUnderline = D1 ('MetaData "FontUnderline" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) ((C1 ('MetaCons "FontUnderlineSingle" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FontUnderlineDouble" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "FontUnderlineSingleAccounting" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FontUnderlineDoubleAccounting" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FontUnderlineNone" 'PrefixI 'False) (U1 :: Type -> Type))))

data FontVerticalAlignment Source #

Vertical alignment

See 22.9.2.17 "ST_VerticalAlignRun (Vertical Positioning Location)" (p. 3794)

Instances

Instances details
Eq FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep FontVerticalAlignment :: Type -> Type #

NFData FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: FontVerticalAlignment -> () #

FromAttrBs FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

FromAttrVal FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FontVerticalAlignment Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep FontVerticalAlignment = D1 ('MetaData "FontVerticalAlignment" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "FontVerticalAlignmentBaseline" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FontVerticalAlignmentSubscript" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FontVerticalAlignmentSuperscript" 'PrefixI 'False) (U1 :: Type -> Type)))

data LineStyle Source #

Instances

Instances details
Eq LineStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord LineStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show LineStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic LineStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep LineStyle :: Type -> Type #

NFData LineStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: LineStyle -> () #

FromAttrVal LineStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal LineStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep LineStyle Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep LineStyle = D1 ('MetaData "LineStyle" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (((C1 ('MetaCons "LineStyleDashDot" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LineStyleDashDotDot" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineStyleDashed" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LineStyleDotted" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineStyleDouble" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LineStyleHair" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineStyleMedium" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "LineStyleMediumDashDot" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LineStyleMediumDashDotDot" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineStyleMediumDashed" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LineStyleNone" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineStyleSlantDashDot" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LineStyleThick" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineStyleThin" 'PrefixI 'False) (U1 :: Type -> Type)))))

data PatternType Source #

Indicates the style of fill pattern being used for a cell format.

Section 18.18.55 "ST_PatternType (Pattern Type)" (p. 2472)

Instances

Instances details
Eq PatternType Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord PatternType Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show PatternType Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic PatternType Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep PatternType :: Type -> Type #

NFData PatternType Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: PatternType -> () #

FromAttrVal PatternType Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal PatternType Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep PatternType Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep PatternType = D1 ('MetaData "PatternType" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) ((((C1 ('MetaCons "PatternTypeDarkDown" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternTypeDarkGray" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PatternTypeDarkGrid" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternTypeDarkHorizontal" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "PatternTypeDarkTrellis" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternTypeDarkUp" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PatternTypeDarkVertical" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PatternTypeGray0625" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternTypeGray125" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "PatternTypeLightDown" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternTypeLightGray" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PatternTypeLightGrid" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PatternTypeLightHorizontal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternTypeLightTrellis" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "PatternTypeLightUp" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternTypeLightVertical" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PatternTypeMediumGray" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PatternTypeNone" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternTypeSolid" 'PrefixI 'False) (U1 :: Type -> Type))))))

data ReadingOrder Source #

Reading order

See 18.8.1 "alignment (Alignment)" (p. 1754, esp. p. 1755)

Instances

Instances details
Eq ReadingOrder Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Ord ReadingOrder Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Show ReadingOrder Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Generic ReadingOrder Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Associated Types

type Rep ReadingOrder :: Type -> Type #

NFData ReadingOrder Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

Methods

rnf :: ReadingOrder -> () #

FromAttrVal ReadingOrder Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

ToAttrVal ReadingOrder Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep ReadingOrder Source # 
Instance details

Defined in Codec.Xlsx.Types.StyleSheet

type Rep ReadingOrder = D1 ('MetaData "ReadingOrder" "Codec.Xlsx.Types.StyleSheet" "xlsx-0.8.4-HaLEmVo1ZhGFVO4n3Yfot" 'False) (C1 ('MetaCons "ReadingOrderContextDependent" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ReadingOrderLeftToRight" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ReadingOrderRightToLeft" 'PrefixI 'False) (U1 :: Type -> Type)))

Lenses

StyleSheet

CellXf

Dxf

Alignment

Border

BorderStyle

Color

Fill

FillPattern

Font

Protection

Helpers

Number formats

fmtDecimals :: Int -> NumberFormat Source #

Basic number format with predefined number of decimals as format code of number format in xlsx should be less than 255 characters number of decimals shouldn't be more than 253

fmtDecimalsZeroes :: Int -> NumberFormat Source #

Basic number format with predefined number of decimals. Works like fmtDecimals with the only difference that extra zeroes are displayed when number of digits after the point is less than the number of digits specified in the format