polynomial-algebra-0.1.0.1: Multivariate polynomial rings

Safe HaskellSafe
LanguageHaskell2010

Math.Algebra.Polynomial.Pretty

Contents

Description

Pretty-printing.

Tip: you can try putting something like this into your .ghci file to make life more convenient:

:m    +Math.Algebra.Polynomial.Pretty  
:seti -interactive-print=prettyPrint
Synopsis

Documentation

class Pretty a where Source #

Minimal complete definition

pretty

Instances
Pretty Int Source # 
Instance details

Defined in Math.Algebra.Polynomial.Pretty

Pretty Integer Source # 
Instance details

Defined in Math.Algebra.Polynomial.Pretty

Pretty Index Source # 
Instance details

Defined in Math.Algebra.Polynomial.Class

Pretty FallingF Source # 
Instance details

Defined in Math.Algebra.Polynomial.Univariate.Pochhammer

Pretty RisingF Source # 
Instance details

Defined in Math.Algebra.Polynomial.Univariate.Pochhammer

(Eq a, Num a, Pretty a) => Pretty (Ratio a) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Pretty

KnownSymbol var => Pretty (U var) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Monomial.Univariate

Methods

pretty :: U var -> String Source #

prettyInParens :: U var -> String Source #

KnownSymbol var => Pretty (XInf var) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Monomial.Infinite

Pretty v => Pretty (Monom v) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Monomial.Generic

(Num c, Eq c, Pretty c, IsSigned c, Pretty b) => Pretty (FreeMod c b) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Pretty

KnownSymbol var => Pretty (XS var n) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Monomial.Indexed

Methods

pretty :: XS var n -> String Source #

prettyInParens :: XS var n -> String Source #

(Ring c, KnownSymbol v, Pretty (XInf v)) => Pretty (Poly c v) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Multivariate.Infinite

(Ring c, Ord v, Pretty v, Pretty (Monom v)) => Pretty (Poly c v) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Multivariate.Generic

KnownSymbol var => Pretty (SgnExt var n) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Monomial.Exterior.Indexed

Methods

pretty :: SgnExt var n -> String Source #

prettyInParens :: SgnExt var n -> String Source #

KnownSymbol var => Pretty (Ext var n) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Monomial.Exterior.Indexed

Methods

pretty :: Ext var n -> String Source #

prettyInParens :: Ext var n -> String Source #

KnownSymbol var => Pretty (Compact var n) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Monomial.Compact

(Ring c, KnownSymbol v) => Pretty (Univariate c v) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Univariate

(KnownSymbol sym, Pretty a, Pretty b) => Pretty (Tensor sym a b) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Monomial.Tensor

Methods

pretty :: Tensor sym a b -> String Source #

prettyInParens :: Tensor sym a b -> String Source #

(Ring c, KnownSymbol v, KnownNat n, Pretty (XS v n)) => Pretty (Poly c v n) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Multivariate.Indexed

Methods

pretty :: Poly c v n -> String Source #

prettyInParens :: Poly c v n -> String Source #

(Ring c, KnownSymbol v, KnownNat n, Pretty (Compact v n)) => Pretty (Poly c v n) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Multivariate.Compact

Methods

pretty :: Poly c v n -> String Source #

prettyInParens :: Poly c v n -> String Source #

(Ring c, KnownSymbol v, KnownNat n, Pretty (Ext v n)) => Pretty (ExtAlg c v n) Source # 
Instance details

Defined in Math.Algebra.Polynomial.Exterior.Indexed

Methods

pretty :: ExtAlg c v n -> String Source #

prettyInParens :: ExtAlg c v n -> String Source #

prettyPrint :: Pretty a => a -> IO () Source #

Pretty printing elements of free modules

showVarPower :: String -> Int -> String Source #

Example: showVarPower "x" 5 == "x^5"

prettyZMod_ :: (b -> String) -> ZMod b -> String Source #

no multiplication sign (ok for mathematica and humans)

prettyZMod :: (b -> String) -> ZMod b -> String Source #

multiplication sign (ok for maple etc)

prettyFreeMod' Source #

Arguments

:: (Num c, Eq c, IsSigned c, Pretty c) 
=> Bool

use star for multiplication (False means just concatenation)

-> (b -> String)

show base

-> FreeMod c b 
-> String 

prettyFreeMod'' Source #

Arguments

:: (c -> String)

show coefficient

-> (b -> String)

show base

-> FreeMod c b 
-> String