canadian-income-tax-2023.0: Canadian income tax calculation
Safe HaskellSafe-Inferred
LanguageHaskell2010

Tax.Canada.Province.AB

Documentation

data AB428 line Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Page1, Foldable t Page2, Foldable t Page3) => Foldable t AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

foldMap :: (Codomain t ~ Const m, Monoid m) => t -> AB428 (Domain t) -> m #

(Transformation t, Functor t Page1, Functor t Page2, Functor t Page3) => Functor t AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

(<$>) :: t -> AB428 (Domain t) -> AB428 (Codomain t) #

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Page1, Traversable t Page2, Traversable t Page3) => Traversable t AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

traverse :: forall m (f :: Type -> Type). Codomain t ~ Compose m f => t -> AB428 (Domain t) -> m (AB428 f) #

Applicative AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

pure :: (forall (a :: k). f a) -> AB428 f #

Apply AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

(<*>) :: forall (p :: k -> Type) (q :: k -> Type). AB428 (p ~> q) -> AB428 p -> AB428 q #

liftA2 :: (forall (a :: k). p a -> q a -> r a) -> AB428 p -> AB428 q -> AB428 r #

liftA3 :: (forall (a :: k). p a -> q a -> r a -> s a) -> AB428 p -> AB428 q -> AB428 r -> AB428 s #

Distributive AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

collect :: forall p a (q :: k1 -> Type). Functor p => (a -> AB428 q) -> p a -> AB428 (Compose p q) #

distribute :: forall p (q :: k1 -> Type). Functor p => p (AB428 q) -> AB428 (Compose p q) #

cotraverse :: Functor m => (forall (a :: k1). m (p a) -> q a) -> m (AB428 p) -> AB428 q #

DistributiveTraversable AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

collectTraversable :: forall f1 a (f2 :: k -> Type). Traversable f1 => (a -> AB428 f2) -> f1 a -> AB428 (Compose f1 f2) #

distributeTraversable :: forall f1 (f2 :: k -> Type). Traversable f1 => f1 (AB428 f2) -> AB428 (Compose f1 f2) #

cotraverseTraversable :: Traversable f1 => (forall (x :: k). f1 (f2 x) -> f x) -> f1 (AB428 f2) -> AB428 f #

Foldable AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

foldMap :: Monoid m => (forall (a :: k). p a -> m) -> AB428 p -> m #

Functor AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

(<$>) :: (forall (a :: k). p a -> q a) -> AB428 p -> AB428 q #

Logistic AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

deliver :: forall p (q :: k1 -> Type). Contravariant p => p (AB428 q -> AB428 q) -> AB428 (Compose p (q ~> q)) #

Traversable AB428 Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

traverse :: Applicative m => (forall (a :: k). p a -> m (q a)) -> AB428 p -> m (AB428 q) #

sequence :: forall m (p :: k -> Type). Applicative m => AB428 (Compose m p) -> m (AB428 p) #

(Show (line Centi), Show (line Rational), Show (line Word)) => Show (AB428 line) Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

showsPrec :: Int -> AB428 line -> ShowS #

show :: AB428 line -> String #

showList :: [AB428 line] -> ShowS #

(Eq (line Centi), Eq (line Rational), Eq (line Word)) => Eq (AB428 line) Source # 
Instance details

Defined in Tax.Canada.Province.AB.AB428.Types

Methods

(==) :: AB428 line -> AB428 line -> Bool #

(/=) :: AB428 line -> AB428 line -> Bool #

fixReturns :: Returns Maybe -> Returns Maybe Source #