Advertisement
Not a member of Pastebin yet?
Sign Up,
it unlocks many cool features!
- word_overlap(W1,W2):- atom_contains(W1,W2);atom_contains(W2,W1).
- longer(W1,W2):- atom_length(W1,L1),atom_length(W2,L2),(L1==L2->W1@>W2;L1<L2).
- slonger(W1,W2,(=)):-W1==W2,!.
- slonger(W1,W2,(>)):-longer(W1,W2),!.
- slonger(_W1,_W2,(<)).
- maybe_stem(W1,W2):- word_overlap(W1,W2),!.
- maybe_stem(W1,W2):- first_half(W1,L1),first_half(W2,L2), word_overlap(L1,L2).
- first_half(S,S2):- atom_length(S,L),L2 is div(L,2), L2>3, sub_atom(S,L2,_,_,S2),!.
- first_half(S,S).
- % imports der/4 and s/6 from wordnet db
- candidate_creation(W1,W2):- der(ID1,SN1,ID2,SN2),s(ID1,SN1,W1,_POS1,_X1,_Y1),s(ID2,SN2,W2,_POS2,_X2,_Y2).
- der_stem(O1,O2):- candidate_creation(W1,W2),maybe_stem(W1,W2),W1\==W2,
- (longer(W1,W2)->(O1:O2=W1:W2);(O2:O1=W1:W2)).
- tellstems:- tell(tellstems),forall(no_repeats(der_stem(O1,O2)),format('~N~q.~n',[my_stems(O1,O2)])),told.
- /*
- my_stems('civil liberty','civil-libertarian').
- my_stems('co-occurrent','co-occurrence').
- my_stems('hair style',hairstylist).
- my_stems('left-handed','left-handedness').
- my_stems('Modern',modernness).
- my_stems('right-handed','right-handedness').
- my_stems('three-dimensional','three-dimensionality').
- my_stems('two-dimensional','two-dimensionality').
- my_stems('up-to-date','up-to-dateness').
- my_stems(abound,abundance).
- my_stems(abrupt,abruptness).
- my_stems(abstemious,abstemiousness).
- my_stems(abundant,abundance).
- my_stems(accelerate,acceleration).
- my_stems(adjacent,adjacency).
- my_stems(admit,admittance).
- my_stems(adnexa,adnexal).
- my_stems(advantage,advantageous).
- my_stems(advantageous,advantageousness).
- my_stems(advantageous,profitableness).
- my_stems(advisable,advisability).
- my_stems(affirmative,affirmativeness).
- my_stems(aimless,aimlessness).
- my_stems(airy,airiness).
- my_stems(align,alignment).
- my_stems(altitude,altitudinal).
- my_stems(altitude,altitudinous).
- my_stems(ambidextrous,ambidexterity).
- my_stems(ambidextrous,ambidextrousness).
- my_stems(ample,ampleness).
- my_stems(ampulla,ampullar).
- my_stems(ampulla,ampullary).
- my_stems(analytic,analyticity).
- my_stems(anastomotic,anastomosis).
- my_stems(anatomy,anatomic).
- my_stems(anatomy,anatomical).
- my_stems(anatomy,anatomist).
- my_stems(angular,angularity).
- my_stems(antecede,antecedence).
- my_stems(antecede,antecedency).
- my_stems(antecedent,antecedence).
- my_stems(antecedent,antecedency).
- my_stems(anterior,anteriority).
- my_stems(area,areal).
- my_stems(arrange,arrangement).
- my_stems(arthromere,arthromeric).
- my_stems(assailable,assailability).
- my_stems(assertive,assertiveness).
- my_stems(assess,assessment).
- my_stems(astringent,astringency).
- my_stems(asymmetry,asymmetric).
- my_stems(asymmetry,asymmetrical).
- my_stems(attenuate,attenuation).
- my_stems(attitude,attitudinise).
- my_stems(auspicious,auspiciousness).
- my_stems(authorise,authorisation).
- my_stems(authorize,authorization).
- my_stems(awkward,awkwardness).
- my_stems(bad,badness).
- my_stems(barren,barrenness).
- my_stems(beam,beamy).
- my_stems(benefit,beneficial).
- my_stems(big,bigness).
- my_stems(bilateral,bilaterality).
- my_stems(boring,boringness).
- my_stems(bottomless,bottomlessness).
- my_stems(bounded,boundedness).
- my_stems(boundless,boundlessness).
- my_stems(bountiful,bountifulness).
- my_stems(brachycephaly,brachycephalic).
- my_stems(breakable,breakability).
- my_stems(bregma,bregmatic).
- my_stems(brief,briefness).
- my_stems(broad,broadness).
- my_stems(bulb,bulbous).
- my_stems(bulgy,bulginess).
- my_stems(bulk,bulky).
- my_stems(bulky,bulkiness).
- my_stems(bumptious,bumptiousness).
- my_stems(cadaver,cadaveric).
- my_stems(cadaver,cadaverous).
- my_stems(caliber,calibrate).
- my_stems(canal,canalize).
- my_stems(canaliculus,canalicular).
- my_stems(capable,capability).
- my_stems(capable,capableness).
- my_stems(capacious,capaciousness).
- my_stems(capacity,capacitate).
- my_stems(catch,catchy).
- my_stems(cauda,caudal).
- my_stems(ceaseless,ceaselessness).
- my_stems(central,centrality).
- my_stems(changeless,changelessness).
- my_stems(channel,channelize).
- my_stems(cheap,cheapness).
- my_stems(chiasm,chiasmal).
- my_stems(chiasm,chiasmatic).
- my_stems(chiasm,chiasmic).
- my_stems(circular,circularity).
- my_stems(clear,clearance).
- my_stems(close,closeness).
- my_stems(cocky,cockiness).
- my_stems(coif,coiffure).
- my_stems(coincide,coincidence).
- my_stems(coincident,coincidence).
- my_stems(comical,comicality).
- my_stems(commodious,commodiousness).
- my_stems(competent,competence).
- my_stems(competent,competency).
- my_stems(complement,complemental).
- my_stems(complement,complementary).
- my_stems(concave,concaveness).
- my_stems(concave,concavity).
- my_stems(concentrate,concentration).
- my_stems(concentric,concentricity).
- my_stems(concomitant,concomitance).
- my_stems(concur,concurrence).
- my_stems(concurrent,concurrence).
- my_stems(consequence,consequential).
- my_stems(constructive,constructiveness).
- my_stems(contemporaneous,contemporaneity).
- my_stems(contemporaneous,contemporaneousness).
- my_stems(contiguous,contiguity).
- my_stems(contiguous,contiguousness).
- my_stems(continue,continuation).
- my_stems(continuous,continuity).
- my_stems(continuous,continuousness).
- my_stems(contractile,contractility).
- my_stems(contrast,contrasty).
- my_stems(convex,convexity).
- my_stems(convex,convexness).
- my_stems(copious,copiousness).
- my_stems(cost,costly).
- my_stems(costly,costliness).
- my_stems(countless,countlessness).
- my_stems(cover,coverage).
- my_stems(crooked,crookedness).
- my_stems(cubic,cubicity).
- my_stems(curl,curly).
- my_stems(curly,curliness).
- my_stems(current,currency).
- my_stems(current,currentness).
- my_stems(curtail,curtailment).
- my_stems(curve,curvature).
- my_stems(curve,curvey).
- my_stems(cutis,cutaneal).
- my_stems(cylindrical,cylindricality).
- my_stems(cylindrical,cylindricalness).
- my_stems(dead,deadness).
- my_stems(dear,dearness).
- my_stems(decelerate,deceleration).
- my_stems(decussate,decussation).
- my_stems(deep,deepness).
- my_stems(defenceless,defencelessness).
- my_stems(defenseless,defenselessness).
- my_stems(defensible,defensibility).
- my_stems(deficient,deficiency).
- my_stems(deliberate,deliberateness).
- my_stems(dense,denseness).
- my_stems(desirable,desirability).
- my_stems(desirable,desirableness).
- my_stems(destructible,destructibility).
- my_stems(destructive,destructiveness).
- my_stems(deterge,detergence).
- my_stems(deterge,detergency).
- my_stems(detergent,detergence).
- my_stems(detergent,detergency).
- my_stems(dextral,dextrality).
- my_stems(diameter,diametral).
- my_stems(diameter,diametric).
- my_stems(diameter,diametrical).
- my_stems(diffuse,diffuseness).
- my_stems(dimensional,dimensionality).
- my_stems(diminutive,diminutiveness).
- my_stems(directional,directionality).
- my_stems(directive,directiveness).
- my_stems(directive,directivity).
- my_stems(disadvantage,disadvantageous).
- my_stems(discretion,discretionary).
- my_stems(dispensable,dispensability).
- my_stems(dispensable,dispensableness).
- my_stems(disseminate,dissemination).
- my_stems(distant,distance).
- my_stems(domestic,domesticity).
- my_stems(dominate,dominance).
- my_stems(down,downy).
- my_stems(dreary,dreariness).
- my_stems(dull,dullness).
- my_stems(durable,durability).
- my_stems(dwarfish,dwarfishness).
- my_stems(early,earliness).
- my_stems(eccentric,eccentricity).
- my_stems(effective,effectiveness).
- my_stems(effective,effectivity).
- my_stems(effectual,effectuality).
- my_stems(effectual,effectualness).
- my_stems(efficacious,efficaciousness).
- my_stems(efficacy,efficacious).
- my_stems(elevate,elevation).
- my_stems(elliptic,ellipticity).
- my_stems(elongate,elongation).
- my_stems(empty,emptiness).
- my_stems(endless,endlessness).
- my_stems(endothelium,endothelial).
- my_stems(enduring,enduringness).
- my_stems(enervate,enervation).
- my_stems(enfranchise,enfranchisement).
- my_stems(enjoy,enjoyment).
- my_stems(enormous,enormity).
- my_stems(enormous,enormousness).
- my_stems(entitle,entitlement).
- my_stems(ephemeral,ephemerality).
- my_stems(ephemeral,ephemeralness).
- my_stems(epidermis,epidermal).
- my_stems(epidermis,epidermic).
- my_stems(epithelium,epithelial).
- my_stems(erect,erectness).
- my_stems(essential,essentiality).
- my_stems(essential,essentialness).
- my_stems(everlasting,everlastingness).
- my_stems(evert,eversion).
- my_stems(exceed,exceedance).
- my_stems(excessive,excessiveness).
- my_stems(executable,executability).
- my_stems(exiguous,exiguity).
- my_stems(exorbitant,exorbitance).
- my_stems(expedient,expedience).
- my_stems(expedient,expediency).
- my_stems(expedition,expeditious).
- my_stems(expeditious,expeditiousness).
- my_stems(expensive,expensiveness).
- my_stems(expose,exposure).
- my_stems(extensive,extensiveness).
- my_stems(external,externality).
- my_stems(extravagant,extravagance).
- my_stems(far,farawayness).
- my_stems(far,farness).
- my_stems(fast,fastness).
- my_stems(favorable,favorableness).
- my_stems(favourable,favourableness).
- my_stems(feasible,feasibility).
- my_stems(feasible,feasibleness).
- my_stems(feckless,fecklessness).
- my_stems(fertile,fertility).
- my_stems(few,fewness).
- my_stems(fine,fineness).
- my_stems(finite,finiteness).
- my_stems(fit,fitness).
- my_stems(flat,flatness).
- my_stems(fleet,fleetness).
- my_stems(fleeting,fleetingness).
- my_stems(flimsy,flimsiness).
- my_stems(forward,forwardness).
- my_stems(fragile,fragility).
- my_stems(frangible,frangibility).
- my_stems(frangible,frangibleness).
- my_stems(frigid,frigidity).
- my_stems(frigid,frigidness).
- my_stems(fruitful,fruitfulness).
- my_stems(fruitless,fruitlessness).
- my_stems(fugacious,fugaciousness).
- my_stems(fugacity,fugacious).
- my_stems(full,fullness).
- my_stems(functional,functionality).
- my_stems(futile,futility).
- my_stems(future,futurity).
- my_stems(fuzz,fuzzy).
- my_stems(gentle,gentleness).
- my_stems(germ,germinate).
- my_stems(glabella,glabellar).
- my_stems(glib,glibness).
- my_stems(globose,globosity).
- my_stems(globular,globularness).
- my_stems(glomerulus,glomerular).
- my_stems(good,goodness).
- my_stems(gradual,graduality).
- my_stems(gradual,gradualness).
- my_stems(grand,grandness).
- my_stems(great,greatness).
- my_stems(hair,hairy).
- my_stems(handed,handedness).
- my_stems(harmful,harmfulness).
- my_stems(hasty,hastiness).
- my_stems(heavy,heaviness).
- my_stems(helpful,helpfulness).
- my_stems(helpless,helplessness).
- my_stems(high,highness).
- my_stems(historical,historicalness).
- my_stems(horizontal,horizontality).
- my_stems(humor,humorist).
- my_stems(humor,humorous).
- my_stems(humour,humourist).
- my_stems(humour,humourous).
- my_stems(hurried,hurriedness).
- my_stems(hydrophobic,hydrophobicity).
- my_stems(idealist,idealism).
- my_stems(idle,idleness).
- my_stems(illustrious,illustriousness).
- my_stems(immediate,immediateness).
- my_stems(immense,immenseness).
- my_stems(immense,immensity).
- my_stems(immoderate,immoderateness).
- my_stems(immortal,immortality).
- my_stems(imperishable,imperishability).
- my_stems(impermanent,impermanence).
- my_stems(impermanent,impermanency).
- my_stems(important,importance).
- my_stems(impotent,impotence).
- my_stems(impotent,impotency).
- my_stems(impracticable,impracticability).
- my_stems(impracticable,impracticableness).
- my_stems(impractical,impracticality).
- my_stems(impuissant,impuissance).
- my_stems(inadvisable,inadvisability).
- my_stems(inauspicious,inauspiciousness).
- my_stems(incapable,incapability).
- my_stems(incessant,incessancy).
- my_stems(incessant,incessantness).
- my_stems(incisive,incisiveness).
- my_stems(incline,inclination).
- my_stems(incompetent,incompetence).
- my_stems(incompetent,incompetency).
- my_stems(inconsequent,inconsequence).
- my_stems(increment,incremental).
- my_stems(indestructible,indestructibility).
- my_stems(indispensable,indispensability).
- my_stems(indispensable,indispensableness).
- my_stems(ineffective,ineffectiveness).
- my_stems(ineffectual,ineffectuality).
- my_stems(ineffectual,ineffectualness).
- my_stems(inefficacious,inefficaciousness).
- my_stems(inessential,inessentiality).
- my_stems(inexpedient,inexpedience).
- my_stems(inexpedient,inexpediency).
- my_stems(inexpensive,inexpensiveness).
- my_stems(infeasible,infeasibility).
- my_stems(infinite,infiniteness).
- my_stems(influence,influential).
- my_stems(infrequent,infrequency).
- my_stems(injurious,injuriousness).
- my_stems(innervate,innervation).
- my_stems(innumerable,innumerableness).
- my_stems(inordinate,inordinateness).
- my_stems(inosculate,inosculation).
- my_stems(insidious,insidiousness).
- my_stems(insignificant,insignificance).
- my_stems(insipid,insipidness).
- my_stems(insoluble,insolubility).
- my_stems(instant,instancy).
- my_stems(instantaneous,instantaneousness).
- my_stems(instrumental,instrumentality).
- my_stems(insubstantial,insubstantiality).
- my_stems(insufficient,insufficiency).
- my_stems(integument,integumental).
- my_stems(integument,integumentary).
- my_stems(interesting,interestingness).
- my_stems(international,internationality).
- my_stems(internationalism,internationalistic).
- my_stems(interoperable,interoperability).
- my_stems(interstice,interstitial).
- my_stems(inutile,inutility).
- my_stems(invaluable,invaluableness).
- my_stems(inward,inwardness).
- my_stems(irregular,irregularity).
- my_stems(irresistible,irresistibility).
- my_stems(irresistible,irresistibleness).
- my_stems(isometry,isometric).
- my_stems(jejune,jejuneness).
- my_stems(jejune,jejunity).
- my_stems(large,extensiveness).
- my_stems(large,largeness).
- my_stems(lasting,lastingness).
- my_stems(late,lateness).
- my_stems(latitude,latitudinarian).
- my_stems(lavish,lavishness).
- my_stems(lean,leanness).
- my_stems(leisurely,leisureliness).
- my_stems(length,lengthy).
- my_stems(lengthy,lengthiness).
- my_stems(lentigo,lentiginous).
- my_stems(liable,liability).
- my_stems(limit,limitation).
- my_stems(limitless,limitlessness).
- my_stems(linear,linearity).
- my_stems(little,littleness).
- my_stems(lobular,lobularity).
- my_stems(lofty,loftiness).
- my_stems(long,longness).
- my_stems(lopsided,lopsidedness).
- my_stems(lord,lordship).
- my_stems(low,lowness).
- my_stems(lush,lushness).
- my_stems(luxuriant,luxuriance).
- my_stems(luxury,luxuriate).
- my_stems(luxury,luxurious).
- my_stems(macula,maculate).
- my_stems(magnify,magnitude).
- my_stems(major,majority).
- my_stems(marginal,marginality).
- my_stems(massive,massiveness).
- my_stems(maximum,maximise).
- my_stems(maximum,maximize).
- my_stems(meager,meagerness).
- my_stems(meagre,meagreness).
- my_stems(meaningful,meaningfulness).
- my_stems(measurable,measurability).
- my_stems(mindless,mindlessness).
- my_stems(minor,minority).
- my_stems(minute,minuteness).
- my_stems(misalign,misalignment).
- my_stems(misplace,misplacement).
- my_stems(moderate,moderateness).
- my_stems(moderate,moderation).
- my_stems(modern,modernity).
- my_stems(modern,modernness).
- my_stems(modernism,modernistic).
- my_stems(modest,modestness).
- my_stems(moment,momentous).
- my_stems(momentous,momentousness).
- my_stems(mortal,mortality).
- my_stems(much,muchness).
- my_stems(multiple,multiplicity).
- my_stems(multitudinous,multitudinousness).
- my_stems(narrow,narrowing).
- my_stems(narrow,narrowness).
- my_stems(near,nearness).
- my_stems(negative,negativeness).
- my_stems(negative,negativity).
- my_stems(negativist,negativism).
- my_stems(newsworthy,newsworthiness).
- my_stems(northern,northernness).
- my_stems(numerous,numerosity).
- my_stems(numerous,numerousness).
- my_stems(oblate,oblateness).
- my_stems(oblique,obliqueness).
- my_stems(oblong,oblongness).
- my_stems(open,opening).
- my_stems(open,openness).
- my_stems(optimism,optimistic).
- my_stems(optimist,optimism).
- my_stems(optimum,optimise).
- my_stems(optimum,optimize).
- my_stems(orientalist,orientalism).
- my_stems(orthogonal,orthogonality).
- my_stems(outrageous,outrageousness).
- my_stems(overabundant,overabundance).
- my_stems(overmuch,overmuchness).
- my_stems(paltry,paltriness).
- my_stems(past,pastness).
- my_stems(pelt,pelting).
- my_stems(penetrate,penetration).
- my_stems(perdurable,perdurability).
- my_stems(permanent,permanence).
- my_stems(permanent,permanency).
- my_stems(perpendicular,perpendicularity).
- my_stems(perpetual,perpetuity).
- my_stems(persistent,persistence).
- my_stems(person,personify).
- my_stems(persuasive,persuasiveness).
- my_stems(pessimism,pessimistic).
- my_stems(pessimist,pessimism).
- my_stems(petite,petiteness).
- my_stems(petty,pettiness).
- my_stems(place,placement).
- my_stems(plane,planeness).
- my_stems(plenteous,plenteousness).
- my_stems(plentiful,plentifulness).
- my_stems(plenty,plenteous).
- my_stems(plethora,plethoric).
- my_stems(poignant,poignancy).
- my_stems(pointed,pointedness).
- my_stems(pointless,pointlessness).
- my_stems(poison,poisonous).
- my_stems(ponderous,ponderousness).
- my_stems(poor,poorness).
- my_stems(pore,poriferous).
- my_stems(positive,positiveness).
- my_stems(positive,positivity).
- my_stems(posterior,posteriority).
- my_stems(posture,postural).
- my_stems(powerful,powerfulness).
- my_stems(powerless,powerlessness).
- my_stems(practicable,practicability).
- my_stems(practicable,practicableness).
- my_stems(practical,practicality).
- my_stems(pragmatic,pragmatism).
- my_stems(pragmatism,pragmatical).
- my_stems(pragmatist,pragmatism).
- my_stems(precede,precedence).
- my_stems(precede,precedency).
- my_stems(precedent,precedence).
- my_stems(precious,preciousness).
- my_stems(precipitant,precipitance).
- my_stems(precipitant,precipitancy).
- my_stems(precipitate,precipitateness).
- my_stems(precipitate,precipitation).
- my_stems(precipitous,precipitousness).
- my_stems(preempt,preemption).
- my_stems(preponderant,preponderance).
- my_stems(preponderate,preponderance).
- my_stems(present,presentness).
- my_stems(press,pressure).
- my_stems(prevail,prevalence).
- my_stems(price,pricey).
- my_stems(priceless,pricelessness).
- my_stems(prior,priority).
- my_stems(priority,prioritize).
- my_stems(probability,probabilistic).
- my_stems(probable,probability).
- my_stems(procrastinate,procrastination).
- my_stems(productive,productiveness).
- my_stems(productive,productivity).
- my_stems(proficient,proficiency).
- my_stems(profitable,profitability).
- my_stems(profitable,profitableness).
- my_stems(profound,profoundness).
- my_stems(profound,profundity).
- my_stems(profuse,profuseness).
- my_stems(prolong,prolongation).
- my_stems(prominent,prominence).
- my_stems(prompt,promptness).
- my_stems(propitious,propitiousness).
- my_stems(protract,protraction).
- my_stems(proximal,proximity).
- my_stems(puissant,puissance).
- my_stems(punctual,punctuality).
- my_stems(puny,puniness).
- my_stems(purposeful,purposefulness).
- my_stems(purposeless,aimlessness).
- my_stems(purposeless,purposelessness).
- my_stems(pushy,pushiness).
- my_stems(quantifiable,quantifiability).
- my_stems(quick,quickness).
- my_stems(ramify,ramification).
- my_stems(rank,rankness).
- my_stems(rapid,rapidity).
- my_stems(rapid,rapidness).
- my_stems(rare,rareness).
- my_stems(reasonable,reasonableness).
- my_stems(recent,recentness).
- my_stems(rectangular,rectangularity).
- my_stems(redundant,redundance).
- my_stems(redundant,redundancy).
- my_stems(regular,regularity).
- my_stems(relative,relativity).
- my_stems(relativity,relativistic).
- my_stems(remote,remoteness).
- my_stems(resistant,resistance).
- my_stems(resourceful,resourcefulness).
- my_stems(responsive,responsiveness).
- my_stems(retard,retardation).
- my_stems(rich,richness).
- my_stems(romantic,romanticism).
- my_stems(romanticist,romanticism).
- my_stems(roomy,roominess).
- my_stems(rotate,rotation).
- my_stems(rotund,rotundity).
- my_stems(rotund,rotundness).
- my_stems(round,roundness).
- my_stems(rounded,roundedness).
- my_stems(runty,runtiness).
- my_stems(scalable,scalability).
- my_stems(scant,scantness).
- my_stems(scanty,scantiness).
- my_stems(scarce,scarceness).
- my_stems(scarce,scarcity).
- my_stems(sciolism,sciolistic).
- my_stems(sciolist,sciolism).
- my_stems(seasonable,seasonableness).
- my_stems(selective,selectivity).
- my_stems(senseless,senselessness).
- my_stems(sensible,sensibleness).
- my_stems(sequence,sequential).
- my_stems(serviceable,serviceability).
- my_stems(serviceable,serviceableness).
- my_stems(shallow,shallowness).
- my_stems(shit,shitty).
- my_stems(shoddy,shoddiness).
- my_stems(short,shortness).
- my_stems(shrill,shrillness).
- my_stems(significant,significance).
- my_stems(simultaneous,simultaneity).
- my_stems(simultaneous,simultaneousness).
- my_stems(sinistral,sinistrality).
- my_stems(sizeable,sizeableness).
- my_stems(skew,skewness).
- my_stems(skin,skinny).
- my_stems(slender,slenderness).
- my_stems(slick,slickness).
- my_stems(slight,slightness).
- my_stems(slim,slimness).
- my_stems(slow,slowing).
- my_stems(slow,slowness).
- my_stems(sluggish,sluggishness).
- my_stems(small,smallness).
- my_stems(solarise,solarisation).
- my_stems(solarize,solarization).
- my_stems(soluble,solubility).
- my_stems(solvable,solvability).
- my_stems(sorry,sorriness).
- my_stems(sound,sounding).
- my_stems(sound,soundness).
- my_stems(southern,southernness).
- my_stems(spacious,spaciousness).
- my_stems(spare,spareness).
- my_stems(sparse,sparseness).
- my_stems(sparse,sparsity).
- my_stems(spatial,spatiality).
- my_stems(special,speciality).
- my_stems(spectrum,spectral).
- my_stems(speed,speedy).
- my_stems(speedy,speediness).
- my_stems(spheric,sphericity).
- my_stems(spherical,sphericalness).
- my_stems(sprawl,sprawling).
- my_stems(sprawl,sprawly).
- my_stems(square,squareness).
- my_stems(squat,squatness).
- my_stems(stark,starkness).
- my_stems(steep,steepness).
- my_stems(stoma,stomatal).
- my_stems(stoma,stomatous).
- my_stems(straight,straightness).
- my_stems(stubby,stubbiness).
- my_stems(stuffy,stuffiness).
- my_stems(stunted,stuntedness).
- my_stems(subsequent,subsequence).
- my_stems(subsequent,subsequentness).
- my_stems(succeed,succession).
- my_stems(successive,successiveness).
- my_stems(sudden,suddenness).
- my_stems(suffice,sufficiency).
- my_stems(sufficient,sufficiency).
- my_stems(suffrage,suffragette).
- my_stems(suffrage,suffragist).
- my_stems(sumptuous,sumptuosity).
- my_stems(sumptuous,sumptuousness).
- my_stems(superabundant,superabundance).
- my_stems(superficial,superficiality).
- my_stems(superfluous,superfluity).
- my_stems(superior,superiority).
- my_stems(supplement,supplemental).
- my_stems(supplement,supplementary).
- my_stems(supplement,supplementation).
- my_stems(swift,swiftness).
- my_stems(symmetrical,symmetricalness).
- my_stems(symmetry,symmetric).
- my_stems(symmetry,symmetrise).
- my_stems(symmetry,symmetrize).
- my_stems(tall,tallness).
- my_stems(tame,tameness).
- my_stems(tardy,tardiness).
- my_stems(tedious,tediousness).
- my_stems(teeming,teemingness).
- my_stems(temporary,temporariness).
- my_stems(tentacle,tentacular).
- my_stems(thick,thickness).
- my_stems(thin,thinness).
- my_stems(tight,tightness).
- my_stems(timely,timeliness).
- my_stems(tiny,tininess).
- my_stems(tiresome,tiresomeness).
- my_stems(title,titulary).
- my_stems(topography,topographic).
- my_stems(topography,topographical).
- my_stems(totipotent,totipotence).
- my_stems(totipotent,totipotency).
- my_stems(transient,transience).
- my_stems(transient,transiency).
- my_stems(transitory,transitoriness).
- my_stems(trashy,trashiness).
- my_stems(trenchant,trenchancy).
- my_stems(triangular,triangularity).
- my_stems(trivial,triviality).
- my_stems(turnover,'turn over').
- my_stems(unbounded,unboundedness).
- my_stems(undesirable,undesirability).
- my_stems(unfavorable,unfavorableness).
- my_stems(unfavourable,unfavourableness).
- my_stems(unfeasible,unfeasibility).
- my_stems(unfit,unfitness).
- my_stems(unhurried,unhurriedness).
- my_stems(unimportant,unimportance).
- my_stems(uninteresting,uninterestingness).
- my_stems(unpersuasive,unpersuasiveness).
- my_stems(unpointed,unpointedness).
- my_stems(unproductive,unproductiveness).
- my_stems(unprofitable,unprofitability).
- my_stems(unprofitable,unprofitableness).
- my_stems(unpropitious,unpropitiousness).
- my_stems(unprotected,unprotectedness).
- my_stems(unresponsive,unresponsiveness).
- my_stems(unseasonable,unseasonableness).
- my_stems(unsound,unsoundness).
- my_stems(untimely,untimeliness).
- my_stems(upright,uprightness).
- my_stems(usable,usableness).
- my_stems(useable,useableness).
- my_stems(useableness,serviceable).
- my_stems(useful,usefulness).
- my_stems(useless,uselessness).
- my_stems(usufruct,usufructuary).
- my_stems(utility,utilitarian).
- my_stems(valuable,valuableness).
- my_stems(value,evaluate).
- my_stems(valueless,valuelessness).
- my_stems(vapid,vapidity).
- my_stems(vapid,vapidness).
- my_stems(vascular,vascularity).
- my_stems(vast,vastness).
- my_stems(verdant,verdancy).
- my_stems(vertical,verticality).
- my_stems(vertical,verticalness).
- my_stems(viable,viability).
- my_stems(virulent,virulence).
- my_stems(virulent,virulency).
- my_stems(vital,vitalness).
- my_stems(vitalness,indispensable).
- my_stems(vivid,vividness).
- my_stems(voiceless,voicelessness).
- my_stems(volume,voluminous).
- my_stems(voluminous,voluminosity).
- my_stems(voluminous,voluminousness).
- my_stems(voluptuous,voluptuousness).
- my_stems(vulnerable,vulnerability).
- my_stems(watery,wateriness).
- my_stems(wavy,waviness).
- my_stems(waxy,waxiness).
- my_stems(weak,weakness).
- my_stems(wee,weeness).
- my_stems(weight,weighty).
- my_stems(weighty,weightiness).
- my_stems(wide,wideness).
- my_stems(wise,wiseness).
- my_stems(woodsy,woodsiness).
- my_stems(woody,woodiness).
- my_stems(worth,worthy).
- my_stems(worthless,worthlessness).
- my_stems(worthwhile,worthwhileness).
- */
Advertisement
Add Comment
Please, Sign In to add comment
Advertisement