canadian-income-tax-2024.0: Canadian income tax calculation
Safe HaskellNone
LanguageHaskell2010

Tax.Canada.Federal.Schedule8

Documentation

data Schedule8 (line :: Type -> Type) Source #

Constructors

Schedule8 

Fields

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Page2, Foldable t Page3, Foldable t Page4, Foldable t Page5, Foldable t Page6, Foldable t Page7, Foldable t Page8, Foldable t Page9, Foldable t Page10) => Foldable t Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Schedule8 (Domain t) -> m0

(Transformation t, Functor t Page2, Functor t Page3, Functor t Page4, Functor t Page5, Functor t Page6, Functor t Page7, Functor t Page8, Functor t Page9, Functor t Page10) => Functor t Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Schedule8 (Domain t) -> Schedule8 (Codomain t)

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Page2, Traversable t Page3, Traversable t Page4, Traversable t Page5, Traversable t Page6, Traversable t Page7, Traversable t Page8, Traversable t Page9, Traversable t Page10) => Traversable t Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Schedule8 (Domain t) -> m0 (Schedule8 f0)

Applicative Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Schedule8 f

Apply Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Schedule8 (p ~> q) -> Schedule8 p -> Schedule8 q

liftA2 :: (forall a. p a -> q a -> r a) -> Schedule8 p -> Schedule8 q -> Schedule8 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Schedule8 p -> Schedule8 q -> Schedule8 r -> Schedule8 s

Distributive Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Schedule8 q) -> p a -> Schedule8 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Schedule8 q) -> Schedule8 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Schedule8 p) -> Schedule8 q

DistributiveTraversable Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Schedule8 f2) -> f1 a -> Schedule8 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Schedule8 f2) -> Schedule8 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Schedule8 f2) -> Schedule8 f

Foldable Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Schedule8 p -> m

Functor Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Schedule8 p -> Schedule8 q

Logistic Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Schedule8 q -> Schedule8 q) -> Schedule8 (Compose p (q ~> q))

Traversable Schedule8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Schedule8 p -> m (Schedule8 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Schedule8 (Compose m p) -> m (Schedule8 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Schedule8 line -> String #

showList :: [Schedule8 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page2 (line :: Type -> Type) Source #

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page2 (Domain t) -> m0

(Transformation t, At t MonthOfYear, At t MonthOfYear) => Functor t Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page2 (Domain t) -> m0 (Page2 f0)

Applicative Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

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

Apply Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

liftA3 :: (forall a. 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.Schedule8

Methods

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

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

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

DistributiveTraversable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

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

Foldable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

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

Functor Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

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

Logistic Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

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

Traversable Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page2 line -> String #

showList :: [Page2 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page3 (line :: Type -> Type) Source #

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page3 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page3 (Domain t) -> Page3 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page3 (Domain t) -> m0 (Page3 f0)

Applicative Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page3 f

Apply Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page3 (p ~> q) -> Page3 p -> Page3 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page3 p -> Page3 q -> Page3 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page3 p -> Page3 q -> Page3 r -> Page3 s

Distributive Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page3 q) -> p a -> Page3 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page3 q) -> Page3 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page3 p) -> Page3 q

DistributiveTraversable Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page3 f2) -> f1 a -> Page3 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page3 f2) -> Page3 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page3 f2) -> Page3 f

Foldable Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page3 p -> m

Functor Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page3 p -> Page3 q

Logistic Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page3 q -> Page3 q) -> Page3 (Compose p (q ~> q))

Traversable Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page3 p -> m (Page3 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page3 (Compose m p) -> m (Page3 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page3 line -> String #

showList :: [Page3 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page4 (line :: Type -> Type) Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, At t Centi, Foldable t SubCalculation, At t Centi, Foldable t SubCalculation, At t Centi, At t Centi, At t Centi, At t Centi, Foldable t SubCalculation, At t Centi, Foldable t SubCalculation, Foldable t SubCalculation, At t Centi, At t Centi, Foldable t SubCalculation, 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 SubCalculation, At t Centi) => Foldable t Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page4 (Domain t) -> m0

(Transformation t, At t Centi, Functor t SubCalculation, At t Centi, Functor t SubCalculation, At t Centi, At t Centi, At t Centi, At t Centi, Functor t SubCalculation, At t Centi, Functor t SubCalculation, Functor t SubCalculation, At t Centi, At t Centi, Functor t SubCalculation, 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 SubCalculation, At t Centi) => Functor t Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page4 (Domain t) -> Page4 (Codomain t)

(Transformation t, Codomain t ~ Compose m f, Applicative m, At t Centi, Traversable t SubCalculation, At t Centi, Traversable t SubCalculation, At t Centi, At t Centi, At t Centi, At t Centi, Traversable t SubCalculation, At t Centi, Traversable t SubCalculation, Traversable t SubCalculation, At t Centi, At t Centi, Traversable t SubCalculation, 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 SubCalculation, At t Centi) => Traversable t Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page4 (Domain t) -> m0 (Page4 f0)

Applicative Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page4 f

Apply Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page4 (p ~> q) -> Page4 p -> Page4 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page4 p -> Page4 q -> Page4 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page4 p -> Page4 q -> Page4 r -> Page4 s

Distributive Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page4 q) -> p a -> Page4 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page4 q) -> Page4 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page4 p) -> Page4 q

DistributiveTraversable Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page4 f2) -> f1 a -> Page4 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page4 f2) -> Page4 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page4 f2) -> Page4 f

Foldable Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page4 p -> m

Functor Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page4 p -> Page4 q

Logistic Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page4 q -> Page4 q) -> Page4 (Compose p (q ~> q))

Traversable Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page4 p -> m (Page4 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page4 (Compose m p) -> m (Page4 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page4 line -> String #

showList :: [Page4 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page5 (line :: Type -> Type) Source #

Constructors

Page5 

Fields

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Page5Part3a, Foldable t Page5Part3b) => Foldable t Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page5 (Domain t) -> m0

(Transformation t, Functor t Page5Part3a, Functor t Page5Part3b) => Functor t Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page5 (Domain t) -> Page5 (Codomain t)

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Page5Part3a, Traversable t Page5Part3b) => Traversable t Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page5 (Domain t) -> m0 (Page5 f0)

Applicative Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page5 f

Apply Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page5 (p ~> q) -> Page5 p -> Page5 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page5 p -> Page5 q -> Page5 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page5 p -> Page5 q -> Page5 r -> Page5 s

Distributive Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page5 q) -> p a -> Page5 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page5 q) -> Page5 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page5 p) -> Page5 q

DistributiveTraversable Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page5 f2) -> f1 a -> Page5 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page5 f2) -> Page5 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page5 f2) -> Page5 f

Foldable Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page5 p -> m

Functor Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page5 p -> Page5 q

Logistic Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page5 q -> Page5 q) -> Page5 (Compose p (q ~> q))

Traversable Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page5 p -> m (Page5 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page5 (Compose m p) -> m (Page5 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page5 line -> String #

showList :: [Page5 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page5Part3a (line :: Type -> Type) Source #

Constructors

Page5Part3a 

Fields

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) => Foldable t Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page5Part3a (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page5Part3a (Domain t) -> Page5Part3a (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) => Traversable t Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page5Part3a (Domain t) -> m0 (Page5Part3a f0)

Applicative Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page5Part3a f

Apply Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page5Part3a (p ~> q) -> Page5Part3a p -> Page5Part3a q

liftA2 :: (forall a. p a -> q a -> r a) -> Page5Part3a p -> Page5Part3a q -> Page5Part3a r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page5Part3a p -> Page5Part3a q -> Page5Part3a r -> Page5Part3a s

Distributive Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page5Part3a q) -> p a -> Page5Part3a (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page5Part3a q) -> Page5Part3a (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page5Part3a p) -> Page5Part3a q

DistributiveTraversable Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page5Part3a f2) -> f1 a -> Page5Part3a (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page5Part3a f2) -> Page5Part3a (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page5Part3a f2) -> Page5Part3a f

Foldable Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page5Part3a p -> m

Functor Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page5Part3a p -> Page5Part3a q

Logistic Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page5Part3a q -> Page5Part3a q) -> Page5Part3a (Compose p (q ~> q))

Traversable Page5Part3a Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page5Part3a p -> m (Page5Part3a q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page5Part3a (Compose m p) -> m (Page5Part3a p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page5Part3a line -> String #

showList :: [Page5Part3a line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page5Part3b (line :: Type -> Type) Source #

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page5Part3b (Domain t) -> m0

(Transformation t, At t Centi, At t Centi, Functor t Page5Part3bCond1, At t Centi, Functor t Page5Part3bCond2, At t Centi) => Functor t Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page5Part3b (Domain t) -> Page5Part3b (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page5Part3b (Domain t) -> m0 (Page5Part3b f0)

Applicative Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page5Part3b f

Apply Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page5Part3b (p ~> q) -> Page5Part3b p -> Page5Part3b q

liftA2 :: (forall a. p a -> q a -> r a) -> Page5Part3b p -> Page5Part3b q -> Page5Part3b r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page5Part3b p -> Page5Part3b q -> Page5Part3b r -> Page5Part3b s

Distributive Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page5Part3b q) -> p a -> Page5Part3b (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page5Part3b q) -> Page5Part3b (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page5Part3b p) -> Page5Part3b q

DistributiveTraversable Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page5Part3b f2) -> f1 a -> Page5Part3b (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page5Part3b f2) -> Page5Part3b (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page5Part3b f2) -> Page5Part3b f

Foldable Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page5Part3b p -> m

Functor Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page5Part3b p -> Page5Part3b q

Logistic Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page5Part3b q -> Page5Part3b q) -> Page5Part3b (Compose p (q ~> q))

Traversable Page5Part3b Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page5Part3b p -> m (Page5Part3b q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page5Part3b (Compose m p) -> m (Page5Part3b p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page5Part3b line -> String #

showList :: [Page5Part3b line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page5Part3bCond1 (line :: Type -> Type) Source #

Constructors

Page5Part3bCond1 

Fields

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page5Part3bCond1 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page5Part3bCond1 (Domain t) -> Page5Part3bCond1 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page5Part3bCond1 (Domain t) -> m0 (Page5Part3bCond1 f0)

Applicative Page5Part3bCond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page5Part3bCond1 f

Apply Page5Part3bCond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page5Part3bCond1 (p ~> q) -> Page5Part3bCond1 p -> Page5Part3bCond1 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page5Part3bCond1 p -> Page5Part3bCond1 q -> Page5Part3bCond1 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page5Part3bCond1 p -> Page5Part3bCond1 q -> Page5Part3bCond1 r -> Page5Part3bCond1 s

Distributive Page5Part3bCond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page5Part3bCond1 q) -> p a -> Page5Part3bCond1 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page5Part3bCond1 q) -> Page5Part3bCond1 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page5Part3bCond1 p) -> Page5Part3bCond1 q

DistributiveTraversable Page5Part3bCond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page5Part3bCond1 f2) -> f1 a -> Page5Part3bCond1 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page5Part3bCond1 f2) -> Page5Part3bCond1 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page5Part3bCond1 f2) -> Page5Part3bCond1 f

Foldable Page5Part3bCond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page5Part3bCond1 p -> m

Functor Page5Part3bCond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page5Part3bCond1 p -> Page5Part3bCond1 q

Logistic Page5Part3bCond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page5Part3bCond1 q -> Page5Part3bCond1 q) -> Page5Part3bCond1 (Compose p (q ~> q))

Traversable Page5Part3bCond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page5Part3bCond1 p -> m (Page5Part3bCond1 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page5Part3bCond1 (Compose m p) -> m (Page5Part3bCond1 p)

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

Defined in Tax.Canada.Federal.Schedule8

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

Defined in Tax.Canada.Federal.Schedule8

data Page5Part3bCond2 (line :: Type -> Type) Source #

Constructors

Page5Part3bCond2 

Fields

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page5Part3bCond2 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page5Part3bCond2 (Domain t) -> Page5Part3bCond2 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page5Part3bCond2 (Domain t) -> m0 (Page5Part3bCond2 f0)

Applicative Page5Part3bCond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page5Part3bCond2 f

Apply Page5Part3bCond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page5Part3bCond2 (p ~> q) -> Page5Part3bCond2 p -> Page5Part3bCond2 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page5Part3bCond2 p -> Page5Part3bCond2 q -> Page5Part3bCond2 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page5Part3bCond2 p -> Page5Part3bCond2 q -> Page5Part3bCond2 r -> Page5Part3bCond2 s

Distributive Page5Part3bCond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page5Part3bCond2 q) -> p a -> Page5Part3bCond2 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page5Part3bCond2 q) -> Page5Part3bCond2 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page5Part3bCond2 p) -> Page5Part3bCond2 q

DistributiveTraversable Page5Part3bCond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page5Part3bCond2 f2) -> f1 a -> Page5Part3bCond2 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page5Part3bCond2 f2) -> Page5Part3bCond2 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page5Part3bCond2 f2) -> Page5Part3bCond2 f

Foldable Page5Part3bCond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page5Part3bCond2 p -> m

Functor Page5Part3bCond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page5Part3bCond2 p -> Page5Part3bCond2 q

Logistic Page5Part3bCond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page5Part3bCond2 q -> Page5Part3bCond2 q) -> Page5Part3bCond2 (Compose p (q ~> q))

Traversable Page5Part3bCond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page5Part3bCond2 p -> m (Page5Part3bCond2 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page5Part3bCond2 (Compose m p) -> m (Page5Part3bCond2 p)

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

Defined in Tax.Canada.Federal.Schedule8

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

Defined in Tax.Canada.Federal.Schedule8

data Page6 (line :: Type -> Type) Source #

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page6 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page6 (Domain t) -> Page6 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page6 (Domain t) -> m0 (Page6 f0)

Applicative Page6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page6 f

Apply Page6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page6 (p ~> q) -> Page6 p -> Page6 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page6 p -> Page6 q -> Page6 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page6 p -> Page6 q -> Page6 r -> Page6 s

Distributive Page6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page6 q) -> p a -> Page6 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page6 q) -> Page6 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page6 p) -> Page6 q

DistributiveTraversable Page6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page6 f2) -> f1 a -> Page6 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page6 f2) -> Page6 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page6 f2) -> Page6 f

Foldable Page6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page6 p -> m

Functor Page6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page6 p -> Page6 q

Logistic Page6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page6 q -> Page6 q) -> Page6 (Compose p (q ~> q))

Traversable Page6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page6 p -> m (Page6 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page6 (Compose m p) -> m (Page6 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page6 line -> String #

showList :: [Page6 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page7 (line :: Type -> Type) 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, Foldable t Page7Cond1, At t Centi, Foldable t SubCalculation, At t Centi, Foldable t Page7Cond2, At t Centi, Foldable t SubCalculation, At t Centi, Foldable t Page7Cond3, 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 Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page7 (Domain t) -> m0

(Transformation t, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, Functor t Page7Cond1, At t Centi, Functor t SubCalculation, At t Centi, Functor t Page7Cond2, At t Centi, Functor t SubCalculation, At t Centi, Functor t Page7Cond3, 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 Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page7 (Domain t) -> Page7 (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, Traversable t Page7Cond1, At t Centi, Traversable t SubCalculation, At t Centi, Traversable t Page7Cond2, At t Centi, Traversable t SubCalculation, At t Centi, Traversable t Page7Cond3, 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 Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page7 (Domain t) -> m0 (Page7 f0)

Applicative Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page7 f

Apply Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page7 (p ~> q) -> Page7 p -> Page7 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page7 p -> Page7 q -> Page7 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page7 p -> Page7 q -> Page7 r -> Page7 s

Distributive Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page7 q) -> p a -> Page7 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page7 q) -> Page7 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page7 p) -> Page7 q

DistributiveTraversable Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page7 f2) -> f1 a -> Page7 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page7 f2) -> Page7 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page7 f2) -> Page7 f

Foldable Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page7 p -> m

Functor Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page7 p -> Page7 q

Logistic Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page7 q -> Page7 q) -> Page7 (Compose p (q ~> q))

Traversable Page7 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page7 p -> m (Page7 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page7 (Compose m p) -> m (Page7 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page7 line -> String #

showList :: [Page7 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page7Cond1 (line :: Type -> Type) Source #

Constructors

Page7Cond1 

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page7Cond1 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page7Cond1 (Domain t) -> Page7Cond1 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page7Cond1 (Domain t) -> m0 (Page7Cond1 f0)

Applicative Page7Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page7Cond1 f

Apply Page7Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page7Cond1 (p ~> q) -> Page7Cond1 p -> Page7Cond1 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page7Cond1 p -> Page7Cond1 q -> Page7Cond1 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page7Cond1 p -> Page7Cond1 q -> Page7Cond1 r -> Page7Cond1 s

Distributive Page7Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page7Cond1 q) -> p a -> Page7Cond1 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page7Cond1 q) -> Page7Cond1 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page7Cond1 p) -> Page7Cond1 q

DistributiveTraversable Page7Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page7Cond1 f2) -> f1 a -> Page7Cond1 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page7Cond1 f2) -> Page7Cond1 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page7Cond1 f2) -> Page7Cond1 f

Foldable Page7Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page7Cond1 p -> m

Functor Page7Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page7Cond1 p -> Page7Cond1 q

Logistic Page7Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page7Cond1 q -> Page7Cond1 q) -> Page7Cond1 (Compose p (q ~> q))

Traversable Page7Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page7Cond1 p -> m (Page7Cond1 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page7Cond1 (Compose m p) -> m (Page7Cond1 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page7Cond1 line -> String #

showList :: [Page7Cond1 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page7Cond2 (line :: Type -> Type) Source #

Constructors

Page7Cond2 

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page7Cond2 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page7Cond2 (Domain t) -> Page7Cond2 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page7Cond2 (Domain t) -> m0 (Page7Cond2 f0)

Applicative Page7Cond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page7Cond2 f

Apply Page7Cond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page7Cond2 (p ~> q) -> Page7Cond2 p -> Page7Cond2 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page7Cond2 p -> Page7Cond2 q -> Page7Cond2 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page7Cond2 p -> Page7Cond2 q -> Page7Cond2 r -> Page7Cond2 s

Distributive Page7Cond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page7Cond2 q) -> p a -> Page7Cond2 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page7Cond2 q) -> Page7Cond2 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page7Cond2 p) -> Page7Cond2 q

DistributiveTraversable Page7Cond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page7Cond2 f2) -> f1 a -> Page7Cond2 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page7Cond2 f2) -> Page7Cond2 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page7Cond2 f2) -> Page7Cond2 f

Foldable Page7Cond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page7Cond2 p -> m

Functor Page7Cond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page7Cond2 p -> Page7Cond2 q

Logistic Page7Cond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page7Cond2 q -> Page7Cond2 q) -> Page7Cond2 (Compose p (q ~> q))

Traversable Page7Cond2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page7Cond2 p -> m (Page7Cond2 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page7Cond2 (Compose m p) -> m (Page7Cond2 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page7Cond2 line -> String #

showList :: [Page7Cond2 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page7Cond3 (line :: Type -> Type) Source #

Constructors

Page7Cond3 

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page7Cond3 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page7Cond3 (Domain t) -> Page7Cond3 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page7Cond3 (Domain t) -> m0 (Page7Cond3 f0)

Applicative Page7Cond3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page7Cond3 f

Apply Page7Cond3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page7Cond3 (p ~> q) -> Page7Cond3 p -> Page7Cond3 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page7Cond3 p -> Page7Cond3 q -> Page7Cond3 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page7Cond3 p -> Page7Cond3 q -> Page7Cond3 r -> Page7Cond3 s

Distributive Page7Cond3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page7Cond3 q) -> p a -> Page7Cond3 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page7Cond3 q) -> Page7Cond3 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page7Cond3 p) -> Page7Cond3 q

DistributiveTraversable Page7Cond3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page7Cond3 f2) -> f1 a -> Page7Cond3 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page7Cond3 f2) -> Page7Cond3 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page7Cond3 f2) -> Page7Cond3 f

Foldable Page7Cond3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page7Cond3 p -> m

Functor Page7Cond3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page7Cond3 p -> Page7Cond3 q

Logistic Page7Cond3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page7Cond3 q -> Page7Cond3 q) -> Page7Cond3 (Compose p (q ~> q))

Traversable Page7Cond3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page7Cond3 p -> m (Page7Cond3 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page7Cond3 (Compose m p) -> m (Page7Cond3 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page7Cond3 line -> String #

showList :: [Page7Cond3 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page8 (line :: Type -> Type) 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, Foldable t SubCalculation, Foldable t SubCalculation, At t Centi, Foldable t Page8Cond1, Foldable t SubCalculation, Foldable t SubCalculation, Foldable t SubCalculation, Foldable t SubCalculation, At t Centi, Foldable t SubCalculation, At t Centi) => Foldable t Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page8 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page8 (Domain t) -> Page8 (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, Traversable t SubCalculation, Traversable t SubCalculation, At t Centi, Traversable t Page8Cond1, Traversable t SubCalculation, Traversable t SubCalculation, Traversable t SubCalculation, Traversable t SubCalculation, At t Centi, Traversable t SubCalculation, At t Centi) => Traversable t Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page8 (Domain t) -> m0 (Page8 f0)

Applicative Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page8 f

Apply Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page8 (p ~> q) -> Page8 p -> Page8 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page8 p -> Page8 q -> Page8 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page8 p -> Page8 q -> Page8 r -> Page8 s

Distributive Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page8 q) -> p a -> Page8 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page8 q) -> Page8 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page8 p) -> Page8 q

DistributiveTraversable Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page8 f2) -> f1 a -> Page8 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page8 f2) -> Page8 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page8 f2) -> Page8 f

Foldable Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page8 p -> m

Functor Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page8 p -> Page8 q

Logistic Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page8 q -> Page8 q) -> Page8 (Compose p (q ~> q))

Traversable Page8 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page8 p -> m (Page8 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page8 (Compose m p) -> m (Page8 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page8 line -> String #

showList :: [Page8 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page8Cond1 (line :: Type -> Type) Source #

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page8Cond1 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page8Cond1 (Domain t) -> Page8Cond1 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page8Cond1 (Domain t) -> m0 (Page8Cond1 f0)

Applicative Page8Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page8Cond1 f

Apply Page8Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page8Cond1 (p ~> q) -> Page8Cond1 p -> Page8Cond1 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page8Cond1 p -> Page8Cond1 q -> Page8Cond1 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page8Cond1 p -> Page8Cond1 q -> Page8Cond1 r -> Page8Cond1 s

Distributive Page8Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page8Cond1 q) -> p a -> Page8Cond1 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page8Cond1 q) -> Page8Cond1 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page8Cond1 p) -> Page8Cond1 q

DistributiveTraversable Page8Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page8Cond1 f2) -> f1 a -> Page8Cond1 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page8Cond1 f2) -> Page8Cond1 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page8Cond1 f2) -> Page8Cond1 f

Foldable Page8Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page8Cond1 p -> m

Functor Page8Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page8Cond1 p -> Page8Cond1 q

Logistic Page8Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page8Cond1 q -> Page8Cond1 q) -> Page8Cond1 (Compose p (q ~> q))

Traversable Page8Cond1 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page8Cond1 p -> m (Page8Cond1 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page8Cond1 (Compose m p) -> m (Page8Cond1 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page8Cond1 line -> String #

showList :: [Page8Cond1 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page9 (line :: Type -> Type) Source #

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t SubCalculation, 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, At t Centi, At t Centi, At t Centi, At t Centi, Foldable t SubCalculation, At t Centi, Foldable t SubCalculation, Foldable t SubCalculation, At t Centi, At t Centi, At t Centi, Foldable t SubCalculation, At t Centi, At t Centi) => Foldable t Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page9 (Domain t) -> m0

(Transformation t, Functor t SubCalculation, 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, At t Centi, At t Centi, At t Centi, At t Centi, Functor t SubCalculation, At t Centi, Functor t SubCalculation, Functor t SubCalculation, At t Centi, At t Centi, At t Centi, Functor t SubCalculation, At t Centi, At t Centi) => Functor t Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page9 (Domain t) -> Page9 (Codomain t)

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t SubCalculation, 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, At t Centi, At t Centi, At t Centi, At t Centi, Traversable t SubCalculation, At t Centi, Traversable t SubCalculation, Traversable t SubCalculation, At t Centi, At t Centi, At t Centi, Traversable t SubCalculation, At t Centi, At t Centi) => Traversable t Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page9 (Domain t) -> m0 (Page9 f0)

Applicative Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page9 f

Apply Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page9 (p ~> q) -> Page9 p -> Page9 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page9 p -> Page9 q -> Page9 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page9 p -> Page9 q -> Page9 r -> Page9 s

Distributive Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page9 q) -> p a -> Page9 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page9 q) -> Page9 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page9 p) -> Page9 q

DistributiveTraversable Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page9 f2) -> f1 a -> Page9 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page9 f2) -> Page9 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page9 f2) -> Page9 f

Foldable Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page9 p -> m

Functor Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page9 p -> Page9 q

Logistic Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page9 q -> Page9 q) -> Page9 (Compose p (q ~> q))

Traversable Page9 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page9 p -> m (Page9 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page9 (Compose m p) -> m (Page9 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page9 line -> String #

showList :: [Page9 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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

data Page10 (line :: Type -> Type) Source #

Instances

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

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> Page10 (Domain t) -> m0

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

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: t -> Page10 (Domain t) -> Page10 (Codomain t)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: forall m0 (f0 :: Type -> Type). Codomain t ~ Compose m0 f0 => t -> Page10 (Domain t) -> m0 (Page10 f0)

Applicative Page10 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

pure :: (forall a. f a) -> Page10 f

Apply Page10 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<*>) :: forall (p :: Type -> Type) (q :: Type -> Type). Page10 (p ~> q) -> Page10 p -> Page10 q

liftA2 :: (forall a. p a -> q a -> r a) -> Page10 p -> Page10 q -> Page10 r

liftA3 :: (forall a. p a -> q a -> r a -> s a) -> Page10 p -> Page10 q -> Page10 r -> Page10 s

Distributive Page10 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collect :: forall p a (q :: Type -> Type). Functor p => (a -> Page10 q) -> p a -> Page10 (Compose p q)

distribute :: forall p (q :: Type -> Type). Functor p => p (Page10 q) -> Page10 (Compose p q)

cotraverse :: Functor m => (forall a. m (p a) -> q a) -> m (Page10 p) -> Page10 q

DistributiveTraversable Page10 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

collectTraversable :: forall f1 a (f2 :: Type -> Type). Traversable f1 => (a -> Page10 f2) -> f1 a -> Page10 (Compose f1 f2)

distributeTraversable :: forall f1 (f2 :: Type -> Type). Traversable f1 => f1 (Page10 f2) -> Page10 (Compose f1 f2)

cotraverseTraversable :: Traversable f1 => (forall x. f1 (f2 x) -> f x) -> f1 (Page10 f2) -> Page10 f

Foldable Page10 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

foldMap :: Monoid m => (forall a. p a -> m) -> Page10 p -> m

Functor Page10 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

(<$>) :: (forall a. p a -> q a) -> Page10 p -> Page10 q

Logistic Page10 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

deliver :: forall p (q :: Type -> Type). Contravariant p => p (Page10 q -> Page10 q) -> Page10 (Compose p (q ~> q))

Traversable Page10 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule8

Methods

traverse :: Applicative m => (forall a. p a -> m (q a)) -> Page10 p -> m (Page10 q)

sequence :: forall m (p :: Type -> Type). Applicative m => Page10 (Compose m p) -> m (Page10 p)

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

show :: Page10 line -> String #

showList :: [Page10 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule8

Methods

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

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