mcs2sdfset {fmcsR} | R Documentation |
Helper function to run atomsubset
from ChemmineR
library on MCS
objects in order to obtain their results in SDFset
format.
mcs2sdfset(x, ...)
x |
Object of class |
... |
Arguments to be passed to/from other methods. |
Returns MCS data in form of a list containing two SDFset
objects, one for the query and one for the target structure.
List with two SDFset
objects.
...
Thomas Girke
...
fmcs
library(fmcsR) data(sdfsample) sdfset <- sdfsample mcs <- fmcs(sdfset[[1]], sdfset[[2]], au=2, bu=1, matching.mode="aromatic") mcs2sdfset(x=mcs, type="new") mcs2sdfset(x=mcs, type="old")[[1]][[1]] plot(mcs2sdfset(x=mcs, type="new")[[1]][1])