library(deSolve)
## Warning: package 'deSolve' was built under R version 3.3.2
LotVmod <- function (Time, State, Pars) {
  with(as.list(c(State, Pars)), {
    dV = (r*V)-(alpha*V*P)
    dP = (beta*V*P)-(q*P)
    return(list(c(dV, dP)))
  })
}

Pars <- c(r = 2, alpha = .1, q = .5, beta = .05)
State <- c(V = 10, P = 1)
Time <- seq(0, 100, by = 1)

out <- as.data.frame(ode(func = LotVmod, y = State, parms = Pars, times = Time))

matplot(out[,-1], type = "l", xlab = "time", ylab = "population")
legend("topright", c("conejos", "zorros"), lty = c(1,2), col = c(1,2), box.lwd = 0)