Lesson 9
Lesson 9
LEARNING OUTCOMES: At the end of the lesson, the learner shall be able to:
LESSON OUTLINE:
168
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
TOPIC 9.1: What is Implicit Differentiation?
(A) INTRODUCTION
The majority of differentiation problems in basic calculus involves functions y written ex-
plicitly as functions of the independent variable x. This means that we can write the
function in the form y = f (x). For such a function, we can find the derivative directly. For
example, if
y = 4x5 + cos(2x 7),
dy
= 20x4 2 sin(2x 7).
dx
However, some functions y are written implicitly as functions of x. This means that the
expression is not given directly in the form y = f (x). A familiar example of this is the
equation
x2 + y 2 = 5,
p
which represents a circle of radius 5 with its center at the origin (0, 0). We can think of
the circle as the union of the graphs of two functions, namely, the function represented
by the upper semi-circle and the function represented by the lower semi-circle. Suppose
thatwe wish to find the slope of the line tangent to the circle at the point ( 2, 1).
The solution is to find the the derivative at the point ( 2, 1). Since the equation of the
circle is not complicated, one way to do this is to write y explicitly in terms of x. Thus,
p
from x2 + y 2 = 5, we obtain y = ± 5 x2 . The positive square root represents the upper
semi-circle while the negative square root represents the bottom semi-circle. Since the
point ( 2, 1) is on the upper semi-circle, the slope of the tangent line is now obtained by
differentiating the function
p
y = 5 x2 = (5 x2 )1/2
dy 1 x
= (5 x2 ) 1/2
( 2x) = p .
dx 2 5 x2
Therefore, the slope of the tangent line at the point ( 2, 1) is the value of the above
derivative evaluated at x = 2, namely
dy 2 2
=p = p = 2.
dx 5 ( 2) 2 1
169
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
In the above example, we obtained the required derivative because we were able to write
y explicitly in terms of the variable x. That is, we were able to transform the original
equation into an equation of the form y = f (x), with the variable y on one side of the
equation, and the other side consisting of an expression in terms of x.
However, there are many equations where it is difficult to express y in terms of x. Some
examples are:
(a) y 3 + 4y 2 + 3x2 + 10 = 0
(c) x + y 3 = ln(xy 4 )
In this lesson, we will learn another method to obtain derivatives. The method is called
implicit differentiation.
We have seen that functions are not always given in the form y = f (x) but in a more
complicated form that makes it difficult or impossible to express y explicitly in terms of
x. Such functions are called implicit functions, and y is said to be defined implicitly.
In this lesson, we explain how these can be differentiated using a method called implicit
differentiation.
Differentiating quantities involving only the variable x with respect to x is not a problem;
for instance, the derivative of x is just 1. But if a function y is defined implicitly, then we
need to apply the Chain Rule in getting its derivative. So, while the derivative of x2 is 2x,
the derivative of y 2 is
dy
2y .
dx
d d dy
(f (y)) = (f (y)) · .
dx dy dx
In order to master implicit differentiation, students need to review and master the appli-
cation of the Chain Rule.
Consider a simple expression such as y 2 = 4x. Its graph is a parabola with vertex at the
origin and opening to the right.
170
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
8
−4 −2 0 2 4 6 8
−2
−4
−6
−8
If we consider only the upper branch of the parabola, then y becomes a function of x. We
can obtain the derivative dy/dx by applying the Chain Rule. When differentiating terms
involving y, we are actually applying the Chain Rule, that is, we first differentiate with
respect to y, and then multiply by dy/dx. Differentiating both sides with respect to x, we
have
y2 = 4x,
d 2 d
=) (y ) = (4x)
dx dx
dy
=) 2y = 4.
dx
Solving for dy/dx, we obtain
dy 4 2
= = .
dx 2y y
Notice that the derivative contains y. This is typical in implicit differentiation.
Let us now use implicit differentiation to find the derivatives dy/dx in the following exam-
ples. Let us start with our original problem involving the circle.
EXAMPLE 1: Find the slope of the tangent line to the circle x2 + y 2 = 5 at the point
( 2, 1).
4
x2 + y 2 = 5
d 2 d
2 =) (x + y 2 ) = (5)
(-2,1)
dx dx
d 2 d 2
=) (x ) + (y ) = 0
2
dx dx
−6 −4 −2 0
dy
=) 2x + 2y = 0.
−2 dx
171
−4
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
Solution. Solving for dy/dx, we obtain
dy 2x x
= = .
dx 2y y
Substituting x = 2 and y = 1, we find that the slope is
dy
= 2.
dx
Notice that this is a faster and easier way to obtain the derivative. .
dy
EXAMPLE 2: Find for y 3 + 4y 2 + 3x2 y + 10 = 0.
dx
Solution. Differentiating both sides of the equation gives
d 3 d
(y + 4y 2 + 3x2 y + 10) = (0)
dx dx
d 3 d d d
=) (y ) + (4y 2 ) + (3x2 y) + (10) = 0
dx dx dx dx
dy dy dy
=) 3y 2 + 8y + 3x2 + 6xy + 0 = 0.
dx dx dx
We collect the terms involving dy/dx and rearrange to get
dy
(3y 2 + 8y + 3x2 ) + 6xy = 0.
dx
Thus,
dy 6xy
= 2 .
dx 3y + 8y + 3x2
Note that the derivative of the term 3x2 y is obtained by applying the Product Rule. We
consider 3x2 as one function and y as another function. .
Implicit differentiation can be applied to any kind of function, whether they are polynomial
functions, or functions that involve trigonometric and exponential, quantitites.
dy 4
EXAMPLE 3: Find for x + y 3 = exy .
dx
Solution. Differentiating both sides with respect to x gives
d d xy4
(x + y 3 ) = (e )
dx dx
dy 4 d
=) 1 + 3y 2 = exy (xy 4 )
dx dx
✓ ◆
2 dy xy 4 3 dy 4
=) 1 + 3y =e 4xy +y
dx dx
Collecting all terms with dy/dx gives
dy ⇣ 2 xy 4 3
⌘ 4
3y e 4xy = 1 + exy y 4
dx
4
dy 1 + exy y 4
=) = 2 .
dx 3y exy4 4xy 3
.
172
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
DERIVATIVES OF THE NATURAL LOGARITHMIC AND INVERSE TANGENT FUNC-
TIONS
The derivatives of some inverse functions can be found by implicit differentiation. Take,
for example, the natural logarithmic function
y = ln x.
Note that it is the inverse function of the exponential function. To find dy/dx, we first
rewrite this into
ey = x (2.5)
and then differentiate implicitly:
d y d
(e ) = (x)
dx dx
dy
=) ey =1
dx
dy 1
=) = y. (2.6)
dx e
y
However, from (2.5), e = x. Hence after substituting this to (2.6), we see that
dy 1
y = ln x = .
=)
dx x
Now, we do a similar process as above to find the derivative of the inverse tangent function.
Let’s consider
y = tan 1 x.
Applying the tangent function to both sides gives
tan y = x. (2.7)
173
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
Derivatives of the Natural Logarithmic and Inverse Tangent Functions
Suppose u is a function of x. Then
d 1 du
• (ln u) = ·
dx u dx
d 1 u) 1 du
• (tan = 2
·
dx 1 + u dx
(a) y = ln(7x2 3x + 1)
(b) y = tan 1 (2x 3 cos x)
(c) y = ln(4x + tan 1 (ln x))
Solution. .
dy 1
(a) = 2 · (14x 3)
dx 7x 3x + 1
dy 1
(b) = · (2 + 3 sin x)
dx 1 + (2x 3 cos x)2
✓ ◆
dy 1 1 1
(c) = · 4 + · .
dx 4x + tan 1 (ln x) 1 + (ln x)2 x
.
dy
EXAMPLE 5: Find for cos(y 2 3) = tan 1 (x3 ) + ln y.
dx
d d
(cos(y 2 3)) = (tan 1 (x3 ) + ln y)
dx dx
dy 1 1 dy
=) sin(y 2 3) · 2y · = 3 2
· 3x2 + · .
dx 1 + (x ) y dx
3x2
✓ ◆
dy 2 1
2y sin(y 3) =
dx y 1 + x6
3x2
dy 1 + x6
=) = .
dx 1
2y sin(y 2 3)
y
.
dy 1y = 3x2 y
p
EXAMPLE 6: Find for tan ln(x y 2 ).
dx
174
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
Solution. Differentiating both sides with respect to x gives
d ⇣ ⌘ d ⇣ 2 ⌘
tan 1 y = 3x y (ln(x y 2 ))1/2
dx dx ✓ ◆
1 dy 2 dy 1⇣ 2
⌘ 1/2 1 dy
=) · = 3x + 6xy ln(x y ) 1 2y
1 + y 2 dx dx 2 x y2 dx
1 dy dy (ln(x y 2 )) 1/2 y(ln(x y 2 )) 1/2 dy
=) 2
· = 3x2 + 6xy + .
1 + y dx dx 2(x y 2 ) x y2 dx
1
tan (x2 ) ln(2x + 3) = 4 cos3 (2y + 5).
Solution.
d d ⇣ ⌘
(tan 1 (x2 ) ln(2x + 3)) = 4 cos3 (2y + 5)
dx dx
1 2 dy
=) 4
· 2x = 12 cos2 (2y + 5) · sin(2y + 5) · 2
1+x 2x + 3 dx
x 1
dy 1 + x4 2x + 3
=) = .
dx 12 cos2 (2y + 5) sin(2y + 5)
.
(C) EXERCISES.
dy
1. Find for the following:
dx
a. x3 + y 3 = 8
b. y sin y = xy
c. tan 1 (x + 3y) = x4
d. e2y + x3 = y
?e. ln(3xy) = x + x5
p p
2. Find the slope of the tangent line to x 3 y + y 3 x = 10 at (1,8).
175
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
3. Find the slope of the tangent line to x2 ey + y 2 ex = 2e at (1,1).
?4. Find the equation of the tangent line to x2 3xy + y 2 = 1 at (2,1).
?5. Consider xy 2
+ x2 y
= 6.
dy
a. Find .
dx
b. Find the slope of the tangent at the point (1,2).
c. Find the point where the tangent line is horizontal.
d. Find the point where the tangent line is vertical.
1.e.
✓ ◆
1 dy
·3 x + y = 1 + 5x4
3xy dx
dy
3x · dx 3y
+ = 1 + 5x4
3xy 3xy
1 dy 1
· + = 1 + 5x4
y dx x
y(5x5 + x
✓ ◆
dy 4 1 1)
= y 1 + 5x =
dx x x
176
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
c. The tangent line is horizontal when dy/dx = 0. Thus,
dy (y 2 + 2xy)
= =0
dx (2xy + x2 )
=) y 2 + 2xy = 0
=) y(y + 2x) = 0
=) y = 0 or y = 2x.
(D) ENRICHMENT
DERIVATIVES OF OTHER TRANSCENDENTAL FUNCTIONS
We have so far learned the derivatives of the following transcendental functions:
d x d 1 d 1
(a) (e ) = ex (b) (ln x) = (c) (tan 1 x) =
dx dx x dx 1 + x2
We now explore the derivatives of bx , logb x, and other inverse trigonometric functions.
y = bx = eln b = ex ln b .
x
(2.9)
dy
Hence, using Chain Rule, = ex ln b · ln b. Therefore, using (2.9),
dx
dy
y = bx =) = bx · ln b.
dx
y = logb x, (2.10)
by = x. (2.11)
Therefore,
d y d
(b ) = (x)
dx dx
dy
=) by · ln b =1
dx
dy 1
=) = y . (2.12)
dx b · ln b
177
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
Finally substituting (2.11) into (2.12) gives
dy 1
y = logb x =) = .
dx x ln b
III. We only show how to find the derivative of sin 1 x, and leave the analogous proofs
of the other derivatives to the teacher. Let x 2 [ 1, 1], and consider y = sin 1 x.
Applying the sine function to both sides of the equation gives
sin y = x. (2.13)
Implicitly differentiating (2.13), we obtain
d d
(sin y) = (x)
dx dx
dy
=) cos y =1
dx
dy 1
=) = . (2.14)
dx cos y
We now find a way to express cos y in terms of x using equation (2.13). However, we
know from trigonometry that
cos2 y + sin2 y = 1
q
=) cos y = ± 1 sin2 y.
Recall that in Precalculus, the range of y = sin 1 x has been restricted to
⇥ ⇡ ⇡⇤
2, 2
(the fourth and first quadrants). Therefore, cos y > 0 and so we only choose cos y =
p
+ 1 sin2 y. Finally, substituting this into (2.14) gives
dy 1 1
y = sin=p x .=)
dx 1 x2
We summarize these three derivatives of the other inverse trigonometric functions:
Summary of Derivatives of Transcendental Functions
Let u be a differentiable function of x.
d u du d 1 du
(a) (e ) = eu (f) (cos 1 (x)) = p
dx dx dx 1 x2 dx
d u du d 1 du
(b) (b ) = bu · ln b (g) (tan 1 (x)) =
dx dx dx 1 + x2 dx
d 1 du d 1 (x)) 1 du
(c) (ln u) = (h) (cot = 2
dx u dx dx 1 + x dx
d 1 du d 1 (x)) 1 du
(d) (logb u) = (i) (sec = p
dx u ln b dx dx x x2 1 dx
d 1 1 du d 1 (x)) 1 du
(e) (sin (x)) = p (j) (csc = p
dx 1 x2 dx dx x x2 1 dx
178
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.
Teaching Tip
A curious student will realize that the derivative of a cofunction of a trigonometric
function is the negative of the derivative of the original trigonometric function. This
is because of the identities
⇡
• cos 1 x = sin 1 (x)
2
⇡
• cot 1 x = tan 1 (x)
2
⇡
• csc 1 x = sec 1 (x).
2
dy
EXAMPLE 7: Find for the following.
dx
(a) y = log2 x
(b) y = 5x
(c) 3y = sec 1x cos 1 (y 2 + 1)
dy 1
Solution. (a) =
dx x ln 2
dy
(b) = 5x · ln 5
dx
(c) We use implicit differentiation here.
!
dy 1 1 dy
3y ln 3 = p p · 2y
dx x x2 1 1 (y 2 + 1)2 dx
!
1 dy 1
3y ln 3 p · 2y = p
1 (y 2 + 1)2 dx x x2 1
1
p
dy x x2 1
= .
dx 1
3y ln 3 p · 2y
1 (y 2 + 1)2
.
179
All rights reserved. No part of this material may be reproduced or transmitted in any form or by any means -
electronic or mechanical including photocopying – without written permission from the DepEd Central Office. First Edition, 2017.