I can't get the partykit package's mob function to do univariate MLE fit.
# Trying to convert vignette example here https://cran.r-project.org/web/packages/partykit/vignettes/mob.pdf on page 7 to do univariate MLE gamma fits.
data("PimaIndiansDiabetes", package = "mlbench")
library("partykit")
library("fitdistrplus")
# Generating some fake data to replace the example data.
op <- options(digits = 3)
set.seed(123)
x <- rgamma(nrow(PimaIndiansDiabetes), shape = 5, rate = 0.1)
PimaIndiansDiabetes$diabetes<-x
PimaIndiansDiabetes$glucose<-x
#Hopefully this change to the formula means fit a gamma to just the diabetes vector of values!
pid_formula <- diabetes ~ 1 | pregnant + pressure + triceps + insulin + mass + pedigree + age
#Defining my own, negative of log likelihood since mob will minimize it.
estfun<-function(z) {-logLik(z)}
#replacing the call to glm that is successful in the vignette example.
class(fitdistr) <- append(class(fitdistr),estfun)
logit <- function(y, x, start = NULL, weights = NULL, offset = NULL, ...) {
fitdistr(y, "gamma")
}
#fail! The mob() function still does not see my artificially created estfun().
pid_tree <- mob(pid_formula, data = PimaIndiansDiabetes, fit = logit)
Error in UseMethod("estfun") : no applicable method for 'estfun' applied to an object of class "fitdistr" The above error message does not appear when glm is used instead of fitdistr
# estfun runs OK outside of call to mob!
estfun(logit(PimaIndiansDiabetes$diabetes,PimaIndiansDiabetes$glucose))
In principle, it is feasible to use
mob()
for what you want to do but there is a misunderstanding of what theestfun()
method is supposed to do and how it is being called.mob()
needs the following pieces of information from a model object to carry out the construction of the tree:coef(object)
.logLik(object)
.estfun(object)
. Seevignette("sandwich-OOP", package = "sandwich")
for an introduction.For objects of class
"fitdistr"
the former two are available but the latter is not:Hence:
The
estfun()
function you have defined does not work for the following two reasons: (1) It is not a methodestfun.fitdistr()
that could be called by the generic functionsandwich::estfun()
that is used through the package'sNAMESPACE
. (2) It does not compute the right quantity: it's the log-likelihood but we need the derivative of the log-density with respect to both parameters and evaluated at each observation. The latter would be an n x 2 matrix.I think it shouldn't be too hard to compute the score function of the gamma distribution by hand. But this should also be available in some R package already, possibly
gamlss.dist
or also other packages.