1 Praise myself Everyday

gdwk <- function(a, color,c) {
  time <- Sys.time()
  now <- as.numeric(format(time, "%H"))
  if (now < 12) {
    say(praise("${EXCLAMATION}!${EXCLAMATION}!-${EXCLAMATION}! 
               Good Morning!You are ${created}!!!
               You will have a ${adjective} Day! "),
        by=a, what_color=color, by_color=c)
  } else {
    say(praise("${EXCLAMATION}!${EXCLAMATION}!-${EXCLAMATION}! 
               You have  ${created} an ${adjective} Job Today! :) "),
        by=a, what_color=color, by_color=c)
  }
}
gdwk("cow", "purple","#eca9b0")
## Colors cannot be applied in this environment :( Try using a terminal or RStudio.
## 
##  ----- 
## AYE!OLE!-YAHOO! 
##                You have  formed an astonishing Job Today! :)  
##  ------ 
##     \   ^__^ 
##      \  (oo)\ ________ 
##         (__)\         )\ /\ 
##              ||------w|
##              ||      ||

Happy Studying!