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

Tax.Canada.Federal.Schedule11

Documentation

data Schedule11 line Source #

Constructors

Schedule11 

Fields

Instances

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Applicative Schedule11 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Apply Schedule11 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Distributive Schedule11 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

DistributiveTraversable Schedule11 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Foldable Schedule11 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Functor Schedule11 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Logistic Schedule11 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Traversable Schedule11 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

show :: Schedule11 line -> String #

showList :: [Schedule11 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

data Page1 line Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, Foldable t SubCalculation, At t Centi, At t Centi, At t Centi) => Foldable t Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

(Transformation t, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, Functor t SubCalculation, At t Centi, At t Centi, At t Centi) => Functor t Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, Traversable t SubCalculation, At t Centi, At t Centi, At t Centi) => Traversable t Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Applicative Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Apply Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Distributive Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

DistributiveTraversable Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Foldable Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Functor Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Logistic Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Traversable Page1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

show :: Page1 line -> String #

showList :: [Page1 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

data Page2 line Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Bool, At t Word, At t Word, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Foldable t Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

(Transformation t, At t Bool, At t Word, At t Word, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Functor t Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Bool, At t Word, At t Word, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi) => Traversable t Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Applicative Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Apply Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Distributive Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

DistributiveTraversable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Foldable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Functor Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Logistic Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

Traversable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

show :: Page2 line -> String #

showList :: [Page2 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule11

Methods

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

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