canadian-income-tax
Safe HaskellNone
LanguageHaskell2010

Tax.Canada.Federal.Schedule6

Documentation

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

Constructors

Schedule6 

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 Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

(Transformation t, Functor t Page2, Functor t Page3, Functor t Page4, Functor t Page5) => Functor t Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Applicative Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

pure :: (forall a. f a) -> Schedule6 f #

Apply Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Distributive Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

DistributiveTraversable Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Foldable Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Functor Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Traversable Schedule6 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: Schedule6 line -> String #

showList :: [Schedule6 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Constructors

Page2 

Instances

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

(Transformation t, Functor t Questions, Functor t PartAColumn, Functor t PartAColumn, At t Centi) => Functor t Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

Methods

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

Apply Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

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.Schedule6

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.Schedule6

Methods

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

Functor Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic Page2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

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 Bool), Show (line Centi), Show (line Rational)) => Show (Page2 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: Page2 line -> String #

showList :: [Page2 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Constructors

Questions 

Fields

Instances

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

(Transformation t, At t Bool, At t Bool, At t Bool, At t Bool, At t Bool, At t Bool) => Functor t Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Applicative Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

pure :: (forall a. f a) -> Questions f #

Apply Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Distributive Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

DistributiveTraversable Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Foldable Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Functor Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Traversable Questions Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: Questions line -> String #

showList :: [Questions line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

data PartAColumn (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 PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Applicative PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

pure :: (forall a. f a) -> PartAColumn f #

Apply PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Distributive PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

DistributiveTraversable PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Foldable PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Functor PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Traversable PartAColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: PartAColumn line -> String #

showList :: [PartAColumn line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Constructors

Page3 

Instances

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

Methods

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

Apply Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

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.Schedule6

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.Schedule6

Methods

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

Functor Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic Page3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

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 Bool), Show (line Centi), Show (line Rational)) => Show (Page3 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: Page3 line -> String #

showList :: [Page3 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

data PartBColumn (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 PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

foldMap :: (Codomain t ~ (Const m0 :: Type -> Type), Monoid m0) => t -> PartBColumn (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 PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Applicative PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

pure :: (forall a. f a) -> PartBColumn f #

Apply PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Distributive PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

DistributiveTraversable PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Foldable PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Functor PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Traversable PartBColumn Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: PartBColumn line -> String #

showList :: [PartBColumn line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Constructors

Page4 

Fields

Instances

Instances details
(Transformation t, Codomain t ~ (Const m :: Type -> Type), Monoid m, Foldable t Step2, Foldable t Step3) => Foldable t Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

(Transformation t, Functor t Step2, Functor t Step3) => Functor t Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

(Transformation t, Codomain t ~ Compose m f, Applicative m, Traversable t Step2, Traversable t Step3) => Traversable t Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

Methods

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

Apply Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

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.Schedule6

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.Schedule6

Methods

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

Functor Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic Page4 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

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 Bool), Show (line Centi), Show (line Rational)) => Show (Page4 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: Page4 line -> String #

showList :: [Page4 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

data Step2 (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 Rational, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Rational, Foldable t SubCalculation, At t Centi) => Foldable t Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Applicative Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

pure :: (forall a. f a) -> Step2 f #

Apply Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Distributive Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

DistributiveTraversable Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Foldable Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Functor Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Traversable Step2 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: Step2 line -> String #

showList :: [Step2 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

data Step3 (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 Rational, At t Centi, At t Centi, At t Centi, At t Centi, At t Centi, At t Rational, Foldable t SubCalculation, At t Centi, At t Centi, At t Centi) => Foldable t Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Applicative Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

pure :: (forall a. f a) -> Step3 f #

Apply Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Distributive Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

DistributiveTraversable Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Foldable Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Functor Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Traversable Step3 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: Step3 line -> String #

showList :: [Step3 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

data Page5 (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, At t Centi) => Foldable t Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

Methods

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

Apply Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

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.Schedule6

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.Schedule6

Methods

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

Functor Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

Logistic Page5 Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

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.Schedule6

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 Bool), Show (line Centi), Show (line Rational)) => Show (Page5 line) Source # 
Instance details

Defined in Tax.Canada.Federal.Schedule6

Methods

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

show :: Page5 line -> String #

showList :: [Page5 line] -> ShowS #

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

Defined in Tax.Canada.Federal.Schedule6

Methods

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

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