Area

Find area of the shaded region

Find area of the shaded region

library(cubature)
fun1 <- function(x){
  (.5*x)+3
  }

fun2 <- function(x){
  (.5*cos(x))+1
}
  
area= hcubature(fun1,0,2*pi)$integral + hcubature(fun2,0,2*pi)$integral
paste("Area of the region is ",round(area,2))
## [1] "Area of the region is  35"