module Data.Int.Base where

The integersπŸ”—

The familiar set of integers, in addition to its intuitive characterisation in terms of positive and negative numbers, can be specified by a wide variety of universal properties:

  • The set of integers, with the operation of addition, is the free group on one generator.

  • The set of integers, with the operations of addition and multiplication, is the initial ring.

  • The set of integers under addition, considered together with the embedding of the positive numbers, is the free group generated by the monoid of natural numbers.

  • The set of integers is the loop space of the circle. More generally, it appears (as a group under addition) as the first non-trivial higher homotopy group of all spheres:

  • The set of integers, with the number zero and the successor equivalence, is the initial pointed type with an equivalence.

All of these specifications can be turned into code, and regardless of your choice, it would be provably equivalent to any of the others. Therefore, there is no mathematical reason to pick one over the others. However, the real world imposes two constraints on us: convenience and efficiency.

On the convenience front, it’s simply more convenient to formalise further results if there is a definition of the integers which we take as the definition. And, since this definition will be ubiquitous, it’s best if it has compact normal forms for numbers, and supports definition of the relevant structure in a computationally nice way.

For definiteness, we go with the most elementary, inductive representation:

data Int : Type where
  pos    : Nat β†’ Int
  negsuc : Nat β†’ Int

The definition above is isomorphic to a sum type, where both summands are the natural numbers. However, if we interpret this naΓ―vely, then we would have a problem: there are now two copies of the number zero! This is, essentially, a problem of intent. We have to choose one of the two summands to contain the number zero, and the names we choose for the constructors must reflect this.

The constructor pos embeds the positive numbers β€” incl. zero! β€” while the constructor negsuc constructs the negation of a successor. This means that negsuc 0 is the representation of the number

Other than these constructors, we can define a difference operation, between natural numbers, valued in the integers. This difference correctly reflects, in its sign, whether we tried to subtract a large quantity from a smaller quantity.

_β„•-_ : Nat β†’ Nat β†’ Int
x     β„•- zero  = pos x
zero  β„•- suc y = negsuc y
suc x β„•- suc y = x β„•- y

We can also use this to demonstrate the offsetting built into negsuc:

_ : 0 β„•- 20 ≑ negsuc 19
_ = refl

EqualityπŸ”—

We mentioned in the introductory paragraph that the type of integers is a set. We will show something stronger: it’s actually discrete. This means that we have a procedure that can tell whether two integers are equal, and produce a refutation when they are not equal. Intuitively, this is because the natural numbers are discrete, and it’s embedded in the integers.

The first thing to do is discriminate between the two constructors. If they match, we can compare the underlying natural numbers:

instance
  Discrete-Int : Discrete Int
  Discrete-Int {pos x} {pos y} with x ≑? y
  ... | yes p = yes (ap pos p)
  ... | no Β¬p = no Ξ» path β†’ Β¬p (pos-injective path)
  Discrete-Int {negsuc x} {negsuc y} with x ≑? y
  ... | yes p = yes (ap negsuc p)
  ... | no Β¬p = no Ξ» path β†’ Β¬p (negsuc-injective path)

If they’re mismatched, we have pre-existing refutations.

  Discrete-Int {pos x} {negsuc y} = no pos≠negsuc
  Discrete-Int {negsuc x} {pos y} = no negsuc≠pos

As the universal symmetryπŸ”—

One of the mentioned characterisations of the integers was as the initial type equipped with a point and an auto-equivalence. This equivalence is the successor function: if we picture the integers as a number line, the effect of this equivalence is to β€œrotate” the line to the right.

sucβ„€ : Int β†’ Int
sucβ„€ (pos n)          = pos (suc n)
sucβ„€ (negsuc zero)    = 0
sucβ„€ (negsuc (suc n)) = negsuc n

predβ„€ : Int β†’ Int
predβ„€ (pos zero)    = -1
predβ„€ (pos (suc n)) = pos n
predβ„€ (negsuc n)    = negsuc (suc n)

The definition of the successor and predecessor functions is slightly complicated by the need to adjust by one when passing between the summands. The proof that these are inverses is a case bash precisely mirroring the structure of the functions.

suc-predβ„€ : (x : Int) β†’ sucβ„€ (predβ„€ x) ≑ x
suc-predβ„€ (negsuc x)    = refl
suc-predβ„€ (pos zero)    = refl
suc-predβ„€ (pos (suc x)) = refl

pred-sucβ„€ : (x : Int) β†’ predβ„€ (sucβ„€ x) ≑ x
pred-sucβ„€ (pos x)          = refl
pred-sucβ„€ (negsuc zero)    = refl
pred-sucβ„€ (negsuc (suc x)) = refl

suc-equiv : Int ≃ Int
suc-equiv = Iso→Equiv (suc℀ , iso pred℀ suc-pred℀ pred-suc℀)

As signed numbersπŸ”—

Considering the isomorphism we arrive at an equivalent representation of the integers: as a pair consisting of a natural number and its sign. We have projections and which correspond to this view: given an integer, we can determine its sign and its absolute value.

data Sign : Type where
  pos neg : Sign

abs : Int β†’ Nat
abs (pos x)    = x
abs (negsuc x) = suc x

sign : Int β†’ Sign
sign (pos x)    = pos
sign (negsuc x) = neg

Conversely, if we have a signed number, we can build an integer. Note that the assign function sends the natural number zero to the integer zero regardless of what sign is specified.

assign : Sign β†’ Nat β†’ Int
assign s   zero    = 0
assign pos (suc n) = pos (suc n)
assign neg (suc n) = negsuc n

AlgebraπŸ”—

We also mentioned two more characterisations of the integers: as the free group on one generator, and as the initial ring. Therefore, we expect to find operations of addition, multiplication, and negation (additive inverse) on the set of integers. They are not that hard to define.

Addition on integers is defined by cases on the sign. If both numbers are positive (resp. negative), then we can compute their sum in the natural numbers. If the numbers have mismatched sign, then the addition function is actually computing a difference, and we already know how to compute differences.

_+β„€_ : Int β†’ Int β†’ Int
pos x +β„€ pos y       = pos (x + y)
pos x +β„€ negsuc y    = x β„•- suc y
negsuc x +β„€ pos y    = y β„•- suc x
negsuc x +β„€ negsuc y = negsuc (suc (x + y))

The negation function is defined by a short case bash. Subtraction is defined as addition against the inverse, rather than as an operation in its own right.

negβ„€ : Int β†’ Int
negβ„€ (pos zero)    = pos zero
negβ„€ (pos (suc x)) = negsuc x
negβ„€ (negsuc x)    = pos (suc x)

_-β„€_ : Int β†’ Int β†’ Int
x -β„€ y = x +β„€ (negβ„€ y)

The implementation of multiplication uses the decomposition of numbers into their signs and absolute values: The product is defined to be

There are actually three different β€œmultiplication” signs in the formula above. The first is sign multiplication, the second is assign, and the last is natural number multiplication.

signΓ— : Sign β†’ Sign β†’ Sign
signΓ— pos pos = pos
signΓ— neg neg = pos
signΓ— pos neg = neg
signΓ— neg pos = neg

_*β„€_ : Int β†’ Int β†’ Int
i *β„€ j = assign (signΓ— (sign i) (sign j)) (abs i * abs j)

There are actually alternative definitions of addition and multiplication: as iterated successor/predecessor, and as iterated addition, respectively. These alternative representations have worse performance, but they behave in a way that is slightly easier to reason about. When establishing the algebraic properties of the integers, we’ll prove that these functions are equivalent to the definitions above, and change between them as appropriate.

rotβ„€ : Int β†’ Int β†’ Int
rotβ„€ (pos zero)       y = y
rotβ„€ (pos (suc x))    y = sucβ„€ (rotβ„€ (pos x) y)
rotβ„€ (negsuc zero)    y = predβ„€ y
rotβ„€ (negsuc (suc x)) y = predβ„€ (rotβ„€ (negsuc x) y)

dotβ„€ : Int β†’ Int β†’ Int
dotβ„€ posz             y = posz
dotβ„€ (possuc x)       y = y +β„€ (dotβ„€ (pos x) y)
dotβ„€ (negsuc zero)    y = negβ„€ y
dotβ„€ (negsuc (suc x)) y = negβ„€ y +β„€ (dotβ„€ (negsuc x) y)

Additional operationsπŸ”—

It is also straightforward to define maximum and minimum operations for integers:

maxβ„€ : Int β†’ Int β†’ Int
maxβ„€ (pos x)    (pos y)    = pos (max x y)
maxβ„€ (pos x)    (negsuc _) = pos x
maxβ„€ (negsuc _) (pos y)    = pos y
maxβ„€ (negsuc x) (negsuc y) = negsuc (min x y)

minβ„€ : Int β†’ Int β†’ Int
minβ„€ (pos x)    (pos y)    = pos (min x y)
minβ„€ (pos _)    (negsuc y) = negsuc y
minβ„€ (negsuc x) (pos _)    = negsuc x
minβ„€ (negsuc x) (negsuc y) = negsuc (max x y)