MEIGO {MEIGOR} | R Documentation |
Wrapper around the different optimisation methods
MEIGO(problem, opts, algorithm, ...)
problem |
List containing problem settings. |
opts |
A list of n_threads lists containing options for each cooperative instance of essR. |
algorithm |
One of VNS, ESS, MULTISTART, CESSR, CEVNSR. Check the documentation of each algorithm for more information. |
... |
Additional input arguments. |
essR
rvnds_hamming
CeVNSR
CeSSR
#global optimum #x*=[0.0898, -0.7127]; # or #x*=[-0.0898, 0.7127]; # #f(x*)= -1.03163; ex1 <- function(x){ y<-4*x[1]*x[1]-2.1*x[1]^4+1/3*x[1]^6+x[1]*x[2]-4*x[2]*x[2]+4*x[2]^4; return(y) } #========================= PROBLEM SPECIFICATIONS =========================== problem<-list(f=ex1,x_L=rep(-1,2),x_U=rep(1,2)) opts<-list(maxeval=500, ndiverse=40, local_solver='DHC', local_finish='LBFGSB', local_iterprint=1) #========================= END OF PROBLEM SPECIFICATIONS ===================== Results<-MEIGO(problem,opts,algorithm="ESS");