1/*
    2
    3  ideally this is used in combination with ontobee
    4  
    5*/
    6
    7:- module(pubmedgraph,
    8          [references/2,
    9           coreference/3,
   10
   11           subclass_axiom_validation/3]).   12
   13:- use_module(library(sparqlprog)).   14:- use_module(library(semweb/rdf11)).   15
   16:- sparql_endpoint( pmg, 'https://stars-app.renci.org/pubmedgraph/sparql').   17
   18:- rdf_register_prefix(dcterm,'http://purl.org/dc/terms/').   19:- rdf_register_prefix(pmid,'https://www.ncbi.nlm.nih.gov/pubmed/').   20
   21references(P,T) :- rdf(P,dcterm:references,T).
   22coreference(P1,P2,T) :- references(P1,T),references(P2,T).
   23
   24subclass_axiom_validation(A,B,P) :-
   25        owl:subClassOf(A,B),
   26        pmg