I was reading the book Flow, it states an argument that everybody is happy in different ways. A runner would feel runners’ high after 5 miles, a couch potato can enjoy the TV drama with ice-cream. While everyone can be happy, not everyone can experience the Flow State. The Flow state only can be achieved by proactively thinking or working towards a clearly defined goal. It can be a tiny goal, as long as we set it intentionally and work towards it. The moment we finish the goal, it is the state of FLOW.
so i decide to experience my flow state by drawing a Pie chart.
The x-axis is our ability, y-axis is the difficult level of the Goal, we are most likely to experience when we are stretching our ability to accomplish a little tough Challenge.
# Create Data
data <- data.frame(
state=c("Flow","Control","Relax","Boring","Indifferent","Worry",
"Anxious","Nervous"),
value=c(15,15,15,15,15,15,15,15)
)
# Compute the position of labels
data <- data %>%
mutate(prop = value / sum(data$value) *100) %>%
mutate(ypos = cumsum(prop)- 0.5*prop )
# Basic piechart
ggplot(data, aes(x="", y=prop, fill=state)) +
geom_bar(stat="identity", width=1, color="white") +
coord_polar("y") +
theme_void() +
theme(legend.position="left") +
geom_text(aes(y = ypos, label = state), color = "black", size=3.5) +
scale_fill_brewer(palette="Set3")x<- seq(0,3,0.05)
y <- 1 + 0.66*x
y2<- 3-0.66*x
y3<- -4+4*x
y4<- 8-4*x
plot(x,y, type="l", col="red", ylim=c(0,4))
lines(x,y2,col="green")
lines(x,y3,col="cyan")
lines(x,y4,col="dark green")