Thursday, 25 January 2024

Tao Analysis I - 3.4.5

Exercise 3.4.5

Let f:XY be a function from one set X to another set Y . Show that f(f1(S))=S for every SY if and only if f is surjective. Show that f1(f(S))=S for every SX if and only if f is injective.


Show f(f1(S))=S if and only if f is surjective.

We need to prove both:

  • f(f1(S))=Sf is surjective.
  • f is surjective f(f1(S))=S.


Let's start with f(f1(S))=Sf is surjective. 

This is a statement of the form AB, which we'll prove by showing the logically equivalent contrapositive ¬B¬A.

So, let's consider that f is not surjective. This means there exists an sS for some SY, such that f(x)s for all xX.

The inverse image f1(S) is, by definition, the set {xX:f(x)S}.

If we apply f to the elements of this set, we obtain the set {f(x)S}. However, this set cannot contain s because f(x)s for all xX.  Therefore the set {f(x)S} is not always S.

Therefore, f not surjective implies f(f1(S))S.

This is logically equivalent to f(f1(S))=Sf is surjective.


Now let's show f is surjective f(f1(S))=S.

To do this we need to show that under the assumption f is surjective, both of the following are true:

  • f(f1(S))S
  • Sf(f1(S))

Let's start with the first f(f1(S))S

If yf(f1(S)) then y=f(x) for some xf1(S). By definition f1(S) is the set {xX:f(x)S}

So if f(x)S then y=f(x)S. That is, yf(f1(S))yS. This is equivalent to f(f1(S))S. Note we didn't need f to be surjective for this.

Now let's consider Sf(f1(S))

Since f is surjective, for every yS there exists an xf1(S) such that f(x)=y

Here, xf1(S) gives us y=f(x)f(f1(S)). Hence, ySyf(f1(S)). This is equivalent to Sf(f1(S))

Having shown both f(f1(S))S, and Sf(f1(S)), we can conclude f(f1(S))=S. This was under the assumption that f is surjective, so we have f is surjective f(f1(S))=S.


Finally, having shown f(f1(S))=Sf is surjective, and f is surjective f(f1(S))=S, we can say f(f1(S))=Sf is surjective.


Show f1(f(S))=S if and only if f is injective.

We need to prove both:

  • f1(f(S))=Sf is injective.
  • f is injective f1(f(S))=S.


Let's start with f1(f(S))=Sf is injective.

This is a statement of the form AB, which we'll prove by showing the logically equivalent contrapositive ¬B¬A.

So, let's consider f is not injective. This means there exists an x1X and x2X, where x1x2, such that f(x1)=f(x2).

Let's consider the case S={x1}. If f(x1)=yY, then f(S)={y}. Since f(x1)=f(x2), we also have y=f(x2).

Now, the inverse image f1(f(S)) is the set {xX:f(x)f(S)}, which here is {xX:f(x){y}}

Both x=x1 and x=x2 satisfy the membership condition of this set, and so this set is not S={x1}

We have shown that f is not injective implies f1(f(S))S for all SX. This is logically equivalent to f1(f(S))=Sf is injective.


Now let's show f is injective f1(f(S))=S.

To do this we need to show that under the assumption f is injective, both of the following are true:

  • f1(f(S))S
  • Sf1(f(S))

Let's start with the first f1(f(S))S.

By definition of inverse images, f1(f(S)) is the set {xX:f(x)f(S)}. If x is a member of this set then f(x)f(S).

But f(S) is the set {f(xs):xsS}. This means there is an xsS such that f(xs)=f(x)

Because f is injective, this implies xs=x. This x is also in S.

We have shown xf1(f(S))xS. That is, f1(f(S))S

Now let's consider Sf1(f(S)).

By definition of inverse images, f1(f(S)) is the set {xX:f(x)f(S)}

If xS, then f(x)f(S), and so x meets the membership conditions of this set. That is, xSxf1(f(S)). This is equivalent to Sf1(f(S)). Note that we don't need f to be injective for this.

By showing both f1(f(S))S and Sf1(f(S)) under the assumption f is injective, we have proven f is injective f1(f(S))=S.  

Sunday, 21 January 2024

Tao Analysis I - 3.4.4

Exercise 3.4.4

Let f:XY be a function from one set X to another set Y, and let U, V be subsets of Y. Show that f1(UV)=f1(U)f1(V), that f1(UV)=f1(U)f1(V), and that f1(UV)=f1(U)f1(V).


Before we attempt the exercise, let's remind ourselves of Definition 3.4.5 for inverse images. If U is a subset of Y, we define the set f1(U) to be the set

f1(U):={xX:f(x)U}

That is, f1 consists of all the elements of X which map into U:

f(x)Uxf1(U)

We call f1(U) the inverse image of U.


Show f1(UV)=f1(U)f1(V)

Let's apply Definition 3.4.5 to f1(UV),

f1(UV):={xX:f(x)UV}

This is the set of x such that either f(x)U or f(x)V, or both, using the definition of union.

Let's consider both cases:

  • f(x)U. Definition 3.4.5 tells us f(x)Uxf1(U)
  • f(x)V. Definition 3.4.5 tells us f(x)Uxf1(V)

Since either or both of these are true, we have either or both of the following are true:

  • xf1(U)
  • xf1(V)

This is equivalent to xf1(U)f1(V).

Thus, we have shown f1(UV)=f1(U)f1(V).

Note that we didn't have to show inclusion in both directions because the definitions we used are bidirectional .


Show f1(UV)=f1(U)f1(V)

Let's apply Definition 3.4.5 to f1(UV),

f1(UV):={xX:f(x)UV}

This is the set of x such that f(x)U and f(x)V, using the definition of intersection.

Let's consider the two cases, both of which must be true:

  • f(x)U. Definition 3.4.5 tells us f(x)Uxf1(U)
  • f(x)V. Definition 3.4.5 tells us f(x)Uxf1(V)

Since both of these are true, then both of the following are true:

  • xf1(U)
  • xf1(V)

This is equivalent to xf1(U)f1(V).

Thus, we have shown f1(UV)=f1(U)f1(V).

Note that we didn't have to show inclusion in both directions because the definitions we used are bidirectional .


Show f1(UV)=f1(U)f1(V)

Let's apply Definition 3.4.5 to f1(UV),

f1(UV):={xX:f(x)UV}

This is the set of x such that f(x)U and f(x)V

Let's consider the two cases, both of which must be true:

  • f(x)U. Definition 3.4.5 tells us f(x)Uxf1(U)
  • f(x)V. Definition 3.4.5 tells us f(x)Uxf1(V)

Since both of these are true, then both of the following are true:

  • xf1(U)
  • xf1(V)

This is equivalent to xf1(U)f1(V).

Thus, we have shown f1(UV)=f1(U)f1(V).

Note that we didn't have to show inclusion in both directions because the definitions we used are bidirectional .

Wednesday, 17 January 2024

Tao Analysis I - 3.4.3

Exercise 3.4.3

Let A, B be two subsets of a set X, and let f:XY be a function. Show that f(AB)f(A)f(B), that f(A)f(B)f(AB), f(AB)=f(A)f(B). For the first two statements, is it true that the relation can be improved to =?


Before we dive into the exercise, let's draw a picture to aid our thinking.


Show that f(AB)f(A)f(B)

We need to show that

yf(AB)yf(A)f(B)

If yf(AB) then there exists an x(AB) such that y=f(x)

Now, 

x(AB)(xA)(xB)

So,

yf(AB)(yf(A))(yf(B))

Note, this is a one-way implication because for a function, given an element of the domain, we can only say there is only one element in the co-domain. For an element in the co-domain, we can't say there is only one corresponding element of the domain.

Thus, we have shown that if yf(AB) then yf(A)f(B)

This is equivalent to f(AB)f(A)f(B).


Can be strengthened to =?  All we need is a counter-example to show this can't be done.

Consider X=Y=Z, A={1}, B={1}, with f:xx2. Here:

  • f(AB)=f()=, the empty set.
  • f(A)f(B)={1}{1}={1}.

Here f(A)f(B)f(AB), a counter-example showing that equality is not possible for general f.


As an extra exercise, let's ask if f injective would enable equality? If f is injective, by definition that means f(s)=f(t)s=t.

So if yf(A)f(B) then yf(A)yf(B). So both of the following must be true:

  • There exists an aA such that y=f(a)f(A).
  • There exists a bB such that y=f(b)f(B).

We have y=f(a)=f(b), which, if f is injective, means a=b. Now this x=a=b is in both A and B, that is x(AB). This gives us y=f(x)f(AB)

So we have shown that if f is injective, f(A)f(B)f(AB). This, combined with the previous result that f(AB)f(A)f(B), gives us equality f(AB)=f(A)f(B).


Show that f(A)f(B)f(AB)

We need to show that yf(A)f(B)yf(AB).

The meaning of yf(A)f(B) is that yf(A)yf(B)

This means both of the following are true:

  • There exists an xA such that f(x)=y.
  • For all xB it is the case that f(x)y. (see note at bottom)

This, xAxB. That is, x(AB). This implies f(x)=yf(AB)

Thus we have shown that f(A)f(B)f(AB).


Can be strengthened to =?  All we need is a counter-example to show this can't be done.

Consider X=Y=Z, A={1}, B={1}, with f:xx2. Here:

  • f(A)f(B)={1}{1}=, the empty set.
  • f(AB)=f({1}{1})=f({1})={1}.

Here f(AB)f(A)f(B), a counter-example showing that equality is not possible for general f.


Show that f(AB)=f(A)f(B)

We need to show both:

  • yf(AB)yf(A)f(B)
  • yf(A)f(B)yf(AB)


If yf(AB) then there exists an xAB such that y=f(x)f(AB). That x could be in A or it could be in B, or both. That means (xA)(xB). Let's consider both cases:

  • xAy=f(x)f(A)f(A)f(B)
  • xBy=f(x)f(B)f(A)f(B)

This means y=f(x)f(A)f(B)

We have shown yf(AB)yf(A)f(B).


If yf(A)f(B) that means yf(A) or yf(B), or both. Let's consider both cases.

  • If yf(A) then there exists an xA such that y=f(x)f(A)f(A)f(B).
  • If yf(B) then there exists an xB such that y=f(x)f(B)f(A)f(B).

This x is in A or B, or both. And both cases imply y=f(x)f(AB).

We have shown yf(A)f(B)yf(AB).


By showing both implications, we have shown f(AB)=f(A)f(B).


Note: Negation of Quantifiers

Above we said that the meaning of yf(A)f(B) is that yf(A)yf(B). We then said this means both of the following are true:

  • There exists an xA such that f(x)=y.
  • For all xB it is the case that f(x)y

For the second bullet point we used negation of quantifiers - we "swap the quantifiers and negate the predicate".

¬[x:f(x)=y]x[f(x)y]

You can read more here: (pdf) and (pdf).

Tuesday, 9 January 2024

Tao Analysis I - 3.4.2

Exercise 3.4.2

Letf:XY be a function from one set X to another set Y, let S be a subset of X, and let U be a subset of Y.

(i) What, in general, can one say about f1(f(S)) and S?

(ii) What about f(f1(U)) and U?

(iii) What about f1(f(f1(U))) and f1(U)?


Let's draw a picture to aid our thinking.

The first thing to note is that f hasn't been defined as injective, so we can't assume it is invertible in the sense that it has an inverse function. We can still discuss an inverse image.

The second thing to say is that S and U are not defined as being related, U is not the image of S under f.


(i) What, in general, can one say about f1(f(S)) and S?

Since f is defined as a function from X to Y, and since SX, then f(S) is defined, and is a subset of Y

Now, by Definition 3.4.5, f1(f(S)) is the inverse image of f(S) where 

f1(f(S))={xX:f(x)f(S)}

If xS, then f(x)f(S). This means such x belong in the set {xX:f(x)f(S)}, which is f1(f(S)).

So we can say Sf1(f(S)).

Note, we can't say f1(f(S))S, and so we can't say the two sets are equal.


(ii) What about f(f1(U)) and U?

We have to be careful here. Every xX has an f(x)Y. However, not every yY has an x such that f(x)Y. This is an asymmetry in the definitions of domain and codomain.

The most we can say about U is that some xX, and possibly no xX, are such that f(x)U. We are not given any facts that tell us every yY has an antecedent in X.

Now, Definition 3.4.5 tell us that

f1(U)={xX:f(x)U}

In words, this inverse image is a set of x such that f(x)U. So if we apply f to this set we have

f(f1(U)U

We can say f(f1(U))U, where that subset could be the empty set.

We can't say the sets are equal because there may be only some, or no, yU such that f(x)=y.


(iii) What about f1(f(f1(U))) and f1(U)?

We can use the result from (i), Sf1(f(S)) and set S=f1(U) to give,

f1(U)f1(f(f1(U)))

Now let's use the result from (ii), f(f1(U)U and take the inverse image of both sides to give,

f1(f(f1(U))f1(U)

This uses the fact that ABf1(A)f1(B), see below for proof.

By showing inclusion in both directions, we have shown the two sets are equal, f1(f(f1(U)))=f1(U).


Show ABf1(A)f1(B)

The definition of inverse image 𝑓1 applied to A is

f1(A)={xX:f(x)A}

Similarly for B

f1(B)={xX:f(x)B}

Since AB, then f(x)Af(x)B.

Thus,

f1(A)f1(B)

Tao Analysis I - 3.4.1

Exercise 3.4.1

Let f:XY be a bijective function, and let f1:YX be its inverse. Let V be any subset of Y. Prove that the forward image of V under f1 is the same set as the inverse image of V under f; thus the fact that both sets are denoted by f1(V) will not lead to any inconsistency.


There are two, sufficiently different, definitions of inverse; that of an inverse function, and the inverse image. Let's remind ourselves of the difference.

Inverse function. If f:XY is bijective, then for every yY, there is exactly one xX such that f(x)=y. This value is denoted f1(y), where f1:YX is the inverse of f.

Definition 3.4.5 (Inverse images). If U is a subset of Y, we define the set f1(U) to be the set

f1(U):=xX:f(x)U

In other words, f1(U) consists of all the elements of X which map into U:

f(x)Uxf1(U)

We call f1(U) the inverse image of U.

The key difference is that inverse images don't require a function to be bijective. For example, f:ZN where f(x)=x2 is not bijective because both f(2)=4, and f(2)=4. This function has no inverse, but we can define an inverse image. Consider U={0,1,4}, then the inverse image f1(U)={2,1,0,1,2}.


Let's proceed with the exercise by starting with a picture to help us think.

We need to show that the following two sets are the same:

  • the image of V under the function f1
  • the inverse image of V under f

Let's start with the image f1(V). This is the set {f1(v):vV}. Now, because f is bijective, it is invertible. By definition of inverse functions, for every vV, there is a single x=f1(v) such that f(x)=v. We can therefore substitute f1(v) with x, and v with f(x) in the set definition to give {x:f(x)V}.

By Definition 3.4.5, the inverse image of V under f is that set of x such that f(x)V. This set is defined as {x:f(x)V}.

The two sets have the same membership condition, and so are the same.

Note that this equivalence between the two definitions hinges on f being bijective. If f were not bijective, then the two sets are not necessarily the same.


Alternative Solution

ProFatXuan's solution takes the standard approach of proving two sets, A and B, are the same by showing that an element of one is an element of the other, AB, and BA. Let's develop a proof using that approach.

Let's define the two sets, A and B:

  • A is the forward image of V under f1. So A={f1(v):vV}
  • B is the inverse image of V under f. So B={xX:f(x)V}

Now, if xA then x=f1(v) for vV. By definition of an inverse function, applicable since f is bijective, every vV has a single x=f1(v) such that f(x)=v. This is the definition of B so AB.

If xB, then it is because those x are such that f(x)=v for vV. Again, by definition of an inverse function, we have x=f1(v) for vV. This is the definition of A, so BA.

By showing elements of one set are members of the other, we have proved the sets are the same.

Sunday, 7 January 2024

Tao Ananlysis I - 3.3.8

Exercise 3.3.8

If X is a subset of Y, let ιXY:XY be the inclusion map from X to Y, defined by mapping xx for all xX, that is, ιXY(x):=x for all xX. The map ιXX is in particular called the identity map on X.

(a) Show that if XYZ then ιYZιXY=ιXZ.

(b) Show that if f:AB is any function, then f=fιAA=ιBBf.

(c) Show that, if f:AB is a bijective function, then ff1=ιBB and f1f=ιAA.

(d) Show that if X and Y are disjoint sets, and f:XZ and g:YZ are functions, then there is a unique function h:XYZ such that hιXXY=f and hιYXY=g.

(e) Show that the hypothesis that X and Y are disjoint can be dropped in (d) if one adds the additional hypothesis that f(x)=g(x) for all xXY.


By the way, that symbol ι is the greek letter iota.


(a) Show that if XYZ then ιYZιXY=ιXZ

Let's first explain the meaning of XYZ. It says that every xX is also in Y, and that every yY is also in Z, resulting in every xX also being in Z.

Now, let's consider ιXY. This is a function from X to Y, mapping xx.

Similarly, ιYZ is a function from Y to Z, mapping yy.

So, the composition ιYZιXY is a function XYZ, mapping xx, then yy. That second mapping is equivalent to xx because the first one maps xx, where xY.

Thus, ιYZιXY is a function XZ, mapping xx. This is the definition of ιXZ.


(b) Show that if f:AB is any function, then f=fιAA=ιBBf.

Let's first consider ιAtoA.  This is a function AA mapping aa, where aA.

The composition fιAtoA is therefore a function AAB, mapping aa then af(a), where f(a)B. This is equivalent to a function AB, mapping af(a). This is the definition of f

So we have shown f=fιAA.

Let's now consider the function ιBB. This is a function BB which maps bb, for bB

The composition ιBBf is a function ABB, which first maps af(a) then bb. Since f(a)B, the second mapping is f(a)f(a). The composition is therefore a function AB, mapping af(a). This is the definition of f.

So we have shown f=ιBBf.


(c) Show that, if f:AB is a bijective function, then ff1=ιBB and f1f=ιAA.

Let's first consider ff1. This composition is a function BAB. Because f is bijective, it is invertible, and for every bB there is a unique aA such that f(a)=b. That a is f1(b)

And so we have ff1(b)=f(a)=b.

The composition is equivalent to a function BB which maps bb. This is the definition of ιBB.

The argument for the second equivalence is very similar.

Consider f1f. This composition is a function ABA. Because f is bijective, it is invertible, and for every bB there is a unique aA such that f(a)=b. That a is f1(b).  

And so we have f1f(a)=f1(b)=a.

The composition is equivalent to a function AA which maps aa. This is the definition of ιAA.


(d) Show that if X and Y are disjoint sets, and f:XZ and g:YZ are functions, then there is a unique function h:XYZ such that hιXXY=f and hιYXY=g.

Our aim is to show that h is indeed a function, and that it is unique. Let's draw a picture to aid our thinking.

For h to be a function, it needs to have a defined domain, codomain, and map elements from the domain to a single element of the codomain. The domain is XY, and the codomain is Z

Does h map elements from the domain to a single element of the codomain? Well, an element of the domain is either in X or in Y but not both since X and Y are disjoint. 

If an element is in X then ιXXY maps xx where xX, but expands the domain X  to XY as the codomain. Importantly, if the input is a particular x, the output is the same x. So the composition hιXXY maps xX to zZ, and we are given this is f(x). Since f is a function, this means h maps each element of X to a single element of Z. The same argument applies for Y and hιXXY, which tells us that h maps each element of Y to a single element of Z.

Because X and Y are disjoint, there is no element of XY which could map to two different elements of Z, via f and g.

So h has a defined domain, codomain, and we have shown it maps elements of XY to a single element of Z. This means h is a function.

Let's now show it is unique. Let's assume h:XYZ and h:XYZ are different functions, subject to the same constraints:

  • hιXXY=f and hιXXY=f
  • hιYXY=g and hιYXY=g

The domain of h is XY. An element of this domain is either in X or Y but not both. Let's consider both cases:

  • For xX, we have h(ιXXY(x))=h(x)=f(x). We also have h(ιXXY(x))=h(x)=f(x). So h(x)=h(x) for xX.
  • For yY, we have h(ιYXY(y))=h(y)=g(y). We also have h(ιYXY(y))=h(y)=g(y). So h(y)=h(y) for yY.

So h=h over the entire domain XY. We have shown that h is unique.


(e) Show that the hypothesis that X and Y are disjoint can be dropped in (d) if one adds the additional hypothesis that f(x)=g(x) for all xXY.

Let's draw a picture to help our thinking.

If we drop the requirement for X and Y to be disjoint, we need another way to ensure that h is a function that maps each element of XY to a single element of Z.

We can see that elements in XY can be mapped by both f and g. To ensure the mapping is unique, we need f(x)=g(x) for all xXY.

Saturday, 6 January 2024

Tao Analysis I - 3.3.7

Exercise 3.3.7

Let f:XY and g:YZ be functions. Show that if f and g are bijective, then so is gf, and we have (gf)1=f1g1.


Show gf is Bijective 

To show gf is bijective, we need to show it is injective and surjective.


For the purpose of contradiction, let's assume gf is not injective. That means there exists x,xX, where xx, such that

g(f(x))=g(f(x))

Since g is injective, by Definition 3.3.17, we have 

g(f(x))=g(f(x))f(x)=f(x)

Again, since f is injective, by Definition 3.3.17, we have

f(x)=f(x)x=x

This contradicts our assertion that xx.  We have shown that gf is injective.


Again, for the purpose of contradiction, let's assume gf is not surjective. This means there exists a zZ such that

g(f(x))z

We are given that g is surjective, which means every zZ has a yY such that z=g(y).  Similarly, we are given that f is surjective, which means that every yY has an xX such that y=f(x)

Together this means every zZ has an xX such that z=g(f(x)). This contradicts our assertion that gf is not surjective. We have shown that gf is surjective.


By showing gf is both injective and surjective, we have shown it is bijective.


Show (gf)1=f1g1

Let's consider (gf)1. We have just shown it is bijective, so it is invertible.

Using the textbook's definition, x=(gf)1(z) is the unique value of x such that

g(f(x))=z

We can apply g1 to both sides,

g1(g(f(x)))=g1(z)

And then simplify using the cancellation law from Exercise 3.3.6,

f(x)=g1(z))

Again, applying f1 to both sides, and using the cancellation law, gives us

x=f1(g1(z))

We have shown x=(gf)1(z)=f1g1(z), which means (gf)1=f1g1.


Friday, 5 January 2024

Tao Analysis I - 3.3.6

Exercise 3.3.6

Let f:XY be a bijective function, and let f1:YX be its inverse. Verify the cancellation laws f1(f(x))=x for all xX and f(f1(y))=y for all yY. Conclude that f1 is also invertible and has f as its inverse (thus (f1)1=f).


Let's first remind ourselves of what the inverse of a function is according to the textbook:

If f is bijective, then for every yY, there is exactly one x such that f(x)=y. This value of x is denoted f1(y); thus f1 is a function from Y to X. We call f1 the inverse of f.


Show  f1(f(x))=x

Let's first consider f(x).

Since f is injective, for every x there is a unique y=f(x)Y. And since f is surjective, for every yY, there is an x such that y=f(x). Together, this means every y has a unique x such that y=f(x). We can therefore denote this x as f1(y), as per the textbook's definition:

f1(y)=x

And since y=f(x), we have

f1(f(x))=x

Thus, we have verified the cancellation law f1(f(x))=x.


Show  f(f1(y))=y

Let's first consider f(x)=y.

Since we have shown that x=f1(x) for all xX, we can write

f(f1(x))=y

Thus, we have verified the cancellation law f(f1(y))=y.


Show f1 is Invertible

To show that a function f is invertible, we need to show it is bijective:

  • If f is not injective, then the inverse would not be unique. 
  • If f is not surjective, then some elements of its codomain Y are not invertible. 


For the purpose of contradiction, let's assume f1 is not injective. That would mean there exist y,yY, where yy, such that

f1(y)=f1(y)

Now, let's use y=f(x) and y=f(x), to give us

f1(f(x))=f1(f(x))

We can apply the first cancellation law above,

x=x

Because f is given as injective, this means f(x)=f(x), that is y=y. This is a contradiction, because we set yy earlier.

Thus we have shown f1 is injective.


Now we need to show f1 is surjective.

For the purpose of contradiction, let's assume f1 is not surjective. That means there exists an xX such that

f1(y)x

Applying f to both sides gives us

f(f(1(y))f(x)=y

Using the second cancellation law gives us

yf(x)=y

This is a contradiction because f is surjective, and for every yY, including this y,  there exists an x such that f(x)=y.

Thus we have shown f1 is surjective.


Having shown f1 is both injective and surjective, that is bijective, we can say it is invertible.


Show f is the inverse of f1

Let's use the description of an inverse given in the textbook.

If f1:YX is bijective, then for every xX, there is exactly one y such that f1(y)=x. This value of y is denoted (f1)1(x), thus (f1)1 is a function from X to Y, and is the inverse of f1.

Let's apply f to both sides of f1(y)=x

f(f1(y))=f(x)

Applying the second cancellation law gives,

y=f(x)

That is, y, which is (f1)1(x), is f(x). That means the inverse of f1 is f.


Thursday, 4 January 2024

Tao Analysis I - 3.3.5

Exercise 3.3.5

Let f:XY and g:YZ be functions. Show that if gf is injective, then f must be injective. Is it true that g must also be injective? Show that if gf is surjective, then g must be surjective. Is it true that f must also be surjective?


In the following, xX and yY.


Injectivity

We are given that gf is injective. Using Definition 3.3.17 for injectivity, this means

g(f(x))=g(f(x))x=x

For the purpose of contradiction, let's assume f is not injective. This means that there is an x and an x, where xx, such that

f(x)=f(x)

That is, two different inputs for f give the same output, due to f not being injective. Because g is a function, the same input gives the same output,

g(f(x))=g(f(x))

This contradicts the given fact that gf is injective, g(f(x))=g(f(x))x=x.

Thus, we have shown that if gf is injective, then f must be injective.

We can show that g doesn't have to be injective with a counter-example. Consider:

  • X={1,2}, Y={1,2,3}, and f(x)=x. Here f is injective.
  • Z={1,2}, and g(1)=1, g(2)=2, g(3)=2. Here g is not injective.

Here, the composition gf is injective, even though g is not.





Surjectivity

We are given that gf is surjective. By Definition 3.3.20, this means that for every zZ there is an xX such that g(f(x))=z.

Intuitively, it is clear that if g is not surjective, then it doesn't hit some elements of Z which contradicts the definition that g(f(x)) must hit every element of Z.

For the purpose of contradiction, let's assume g is not surjective. That means there is an element zZ where g(y)z, which is true for all yY. Now f(x)Y, so we have g(f(x))z. This contradicts the given statement that gf is surjective.

Thus, we have shown that if gf is surjective, then g must be surjective.

We can show that f doesn't have to be surjective with a counter-example. Consider:

  • X={1,2,3}, Y={1,2,3}, and f(1)=1, f(2)=2, f(3)=2. Here f is not surjective.
  • Z={1,2}, and g(x)=x. Here g is surjective.

Here, the composition gf is surjective, even though f is not.





Wednesday, 3 January 2024

Tao Analysis I - 3.3.4

Exercise 3.3.4

In this section we give some cancellation laws for composition. Let f:XY, f~:XY, g:YZ, and g~:YZ be functions. Show that if gf=gf~ and g is injective, then f=f~. Is the same statement true if g is not injective? Show that if gf=g~f and f is surjective, then g=g~. Is the same statement true if f is not surjective?


Injective Cancellation Law

Let's look at the first part of the question. We are given

gf=gf~

and g is injective.

If g is injective, then by Definition 3.3.17, g(x)=g(x)x=x for x,xX, which here means

g(f(x))=g(f~(x))f(x)=f~(x)

That is, f(x) and f~(x) map xX to the very same values, and are thus, equal functions.

We have shown that if gf=gf~ and g is injective, then f=f~.

If g is not injective, then the statement is not always true. A counter-example is sufficient to prove this. Consider f(x)=x, f~=x, and g(x)=x2. Here gf=gf~ but ff~.


Surjective Cancellation Law

We are given

gf=g~f

and f is surjective.

If f is surjective, then by Definition 3.3.20, every value of y=f(x)Y has an xX. This means the full domain Y is available to the function g, a requirement of the definition of g.

If we consider

g(y)=g~(y)

This tells us that g and g~ both map yY to the same values, and we have already seen the surjectivity of f provides for the full Y as a domain for g.

Thus, we have shown that if gf=g~f and f is surjective, then g=g~.

If f is not surjective then the domain available to g is not the full Y. Consider an example, f(x)=|x| which is not surjective, g(x)=|x| and g~(x)=x. Here gf=g~f but gg~.

Monday, 1 January 2024

Tao Analysis I - 3.3.3

Exercise 3.3.3

When is the empty function into a given set X injective? surjective? bijective?


Let's remind ourselves that an empty function f:X maps from the empty set to a given set X. Since the empty set has no elements, we do not need to specify what f does to any input. Note that each and every set X has only one empty function from to that X.


When is the empty function injective?

Any function must map an input to only one output, but an injective function also requires that different inputs don't map to the same output. This is Definition 3.3.17.

xxf(x)f(x)

Since the empty function has no elements, the condition for an empty function f:X to be injective is vacuously true.


When is the empty function surjective?

A function f:AX is surjective if every element x of the codomain X has an a in the domain A such that f(a)=x. This is Definition 3.3.20.

xxf(x)f(x)

Since the domain A= of an empty function has no elements, then the definition can't apply. The only exception is when the codomain is empty X=, in which case the defining condition is vacuously true.

An empty function is surjective if the codomain X is the empty set . .


When is the empty function bijective?

A function is bijective if it is both injective and surjective. A bijective function is also called invertible. This is from Definition 3.3.23.

Given the above discussion, an empty function is always injective but only surective when the codomain is the emptyset. 

Thus, the empty function is bijective, invertible, when the codomain is the empty set X=.