Menu
  • HOME
  • TAGS

How to combine values composed of lists with common items in a dictionary using Python?

python,list,dictionary,merge,set-union

If you want to change the original dict you will need to copy: vals = {k: set(val) for k, val in dict1.items()} for key, val in dict1.copy().items(): for k, v in vals.copy().items(): if k == key: continue if v.intersection(val): union = list(v.union(val)) dict1[key] = union del vals[k] del dict1[k] If...

Can I merge an unknown named graph with an other in a SPARQL query?

syntax,merge,rdf,sparql

There is no standard way to change the dataset beign queried after the query starts. This is especially true if FROM is loading from the web. If you can put all the possible graphs in the datasets, you can use GRAPH. if you can't, then your two step approach is...

git has problems with squashing commits once there is “Merge branch”

git,merge

I found the answer for what I really wanted – in fact I was just looking for: git reset --soft ZZZ git commit -a -m "Message for the merged commit." This way I can merge the commits without any necessity for conflict resolving....

Git workflow: “Your local changes would be overwritten by merge”

git,github,merge

You are right, you get that message because the files already exist locally, are not tracked in the currently checked out version, and the commit you are trying to merge in contains the file. When Git already knows the file before the merge, then it can safely agree to overwrite...

How to add/merge dataframes in a list

r,merge

If the 'lst' has seven data.frames and want to 'rbind' the 8th dataset to each of the datasets in the list, we can use Map Map(rbind, lst, list(d1)) Or using lapply lapply(lst, rbind, d1) Update If the 'lst' is of length 8, and wants to rbind the first 7 elements...

Add a row made of 0 for each identifier in a large database

r,merge,data.frame,rbind

Try: library(dplyr) dt %>% group_by(id) %>% summarise(activity = 0, time = 0) %>% merge(., dt, all = T) %>% arrange(id, time) Or: dt %>% group_by(id) %>% summarise_each(funs(as.character(0))) %>% full_join(., dt) %>% arrange(id, time) Which gives: # id activity time #1 A1 0 0 #2 A1 15 1 #3 A1 17...

Hg Mercurial - Upgrading code not in repository

version-control,merge,mercurial,tortoisehg

Doing the merge vice versa (your changes into v3.6 might work better. Also make sure that you have selected a reasonable merge tool (internal works, but there are possibly more convenient ones out there, I use kdiff3 myself): I assume you have a repository with v3.5 and on top of...

SQL: Query to merge (some) rows

sql,oracle,merge,sum,group

Try this: select case when country in('Austria','Spain','Italy') then Country else 'Other' end as Country, sum(Jan) as Jan, sum(Feb) as Feb, sum(Mar) as Mar from t group by case when country in('Austria','Spain','Italy') then Country else 'Other' end Fiddle http://sqlfiddle.com/#!4/93719/2...

How to merge rows in SQL based on dates columns if dates are in sequence?

sql-server,merge

This sounds like a gaps and islands problem. Assuming your ranges are always just 1 day long you can do this with row number to calculate the distance from the first day of the group to the row. All those that have the same distance (e.g. deducting the row number...

In SVN is there a straighforward way to merge back each change individually?

svn,merge

You can use svn mergeinfo --show-revs eligible to find revisions to merge. And then use svn merge -c REV to merge each revision. Also check out the --accept option to merge. This may help you resolve issues with conflicting (binary) files automatically.

R - combine data frames of different lengths after loop

r,loops,merge,data.frame

You can try Reduce(function(...) merge(..., by='date', all=TRUE), lst) where lst is the list of data.frames data set.seed(24) df2 <- df[sample(1:nrow(df),8, replace=FALSE),] row.names(df2) <- NULL lst <- list(df, df2) ...

Git merge driver is not used

git,merge,git-merge

My initial config works fine as far as you don't have a BOM in your .gitattributes

neo4j load csv invalid “ON MATCH”

merge,neo4j,load-csv

this is because it merges not only on hit_id but also on date_time as you specified both in the MERGE clause you should change it to: MERGE (hit :Hit { id:line.hit_id }) ON CREATE SET hit.created = timestamp(), hit.date_time=TOINT(line.date_time) ON MATCH SET hit.updated = timestamp() Update It does not really...

Join matrices with same values in different vectors in MATLAB

matlab,matrix,merge

You don't need to use a loop, use intersect instead. [~,ic,ip] = intersect(c(:, 1:3),p(:, 1:3),'rows'); m = [c(ic, :), p(ip,end)]; Edit: If you want to include NaNs where they don't intersect like the above poster. function m = merge(c, p, nc, np) %check for input arg errors if nargin ==...

Merge duplicates in array PHP [closed]

php,arrays,merge,totals

You can do it with mysqli OR you can apply a custom method on your array $temp_array = $new_array = array(); foreach($array as $key => $arr_values){ if(!in_array($arr_values['product_id'], $temp_array)){ array_push($temp_array, $arr_values['product_id']); array_push($new_array,$array[$key]); } } // this code will do the trick ...

merge structure field cells in matlab

matlab,merge,structure,field

You can first write a small helper function to merge the cells: function R = mergeCells(A,B) R = {}; IA = ~cellfun('isempty',A); IB = ~cellfun('isempty',B); R(IA) = A(IA); R(IB) = B(IB); end and then call it in a loop to merge the fields for k = 1:numel(F), f = F{k};...

R - Merging Two Data.Frames with Row-Level Conditional Variables

python,mysql,r,merge,dplyr

In R, You could take a look at the data.table::foverlaps function library(data.table) # Set start and end values in `df` and key by them and by `Store` setDT(df)[, c("StartDate", "CloseDate") := list(t, t)] setkey(df, Store, StartDate, CloseDate) # Run `foverlaps` function foverlaps(setDT(Stores), df) # Store t var1 StartDate CloseDate i.StartDate...

Merge JSON Object with same “key” and add their “value” using JavaScript

javascript,json,merge,key,value

var json = '{"rows":[{"key":["zeit.de"],"value":98},{"key":["google.com"],"value":49},{"key":["spiegel.de"],"value":20},{"key":["spiegel.de"],"value":12},{"key":["spiegel.de"],"value":20},{"key":["spiegel.de"],"value":12},{"key":["netmng.com"],"value":49},{"key":["zeit.de"],"value":300}]}'; var obj = JSON.parse(json); var newObj = {}; for(i in obj['rows']){ var item = obj['rows'][i]; if(newObj[item.key[0]] === undefined){ newObj[item.key[0]] = 0; } newObj[item.key[0]] += item.value; } var result = {}; result.rows = []; for(i in...

Merging arrays with passing a function as parameter

javascript,merge,callback

In merge, you: Create a new, blank array for the return value. Consider what you want to do if array1 and array2 aren't the same length, although they are in the example usage. Use an index variable to loop from 0 through < array1.length (most likely a for loop). Fill...

Simple merge_sort on list - analysis

c,list,function,merge,sorted

When you assign the new head, you must also advance the list you take it from: if (h1 && h2) { if (h1->vol > h2->vol) { h = h2; h2 = h2->next; } else { h = h1; h1 = h1->next; } } Otherwise you will take the same node,...

How to move multiple lines to join another using notepad++

merge,notepad++

You can do: Type Ctrl+H Find what: =\R Replace with: NOTHING Then click on Replace all...

Git: Is there a way to re-merge two commits on the same branch (FF) to a new branch?

git,merge,branch

Probably what they did was save their versions of some file(s) (possibly all of the files in question), then after rebasing their work on your commit, copy their saved version of the files, thus reverting your own work (without using an actual git revert, but still totally failing the idea...

Mercurial - merging last three unpushed commits

version-control,merge,mercurial,commit,tortoisehg

You can use the 'histedit' extension for this. To activate it, add the following to your hgrc: [extensions] histedit = If these are the only unpushed changesets, you can use hg histedit --outgoing. Once in the histedit interface, 'fold' will be a useful action for you (it allows combining your...

R: Merge two data frames by common columns

r,merge

You can index y by the column names that x and y have in common: y[,intersect(names(x), names(y))] # A1 A3 A5 A6 # 1 9 11 10 10 # 2 0 2 8 1 # 3 0 0 0 0 # 4 12 12 12 12 # 5 11 9...

Merging PDF files with similar names using PDFTK and a bash script

linux,bash,pdf,merge,pdftk

Try this: find . -type f -iname "[0-9][0-9][0-9][0-9][0-9]*.pdf" -printf "%.5f\n" | sort -u | while read -r file; do echo pdftk ${file}*.pdf cat output $file.pdf; done If output is okay, remove echo....

Aggregating while merging two dataframes in R

r,merge,data.table,aggregate,dplyr

This could be another way to do this using dplyr() (This should be effective if your data set is huge) library(dplyr) df = subset(sku_transact_merge, date > beg_date & date < end_date) df = subset(df, select= -c(date)) out = unique(df %>% group_by(productId,old_price) %>% mutate(qty = sum(qty))) #> out #Source: local data...

Joining two Pandas DataFrames does not work anymore?

join,pandas,merge,dataframes

short story: as pointed out in the comment already, i was comparing strings with integers. long story: i didn't expect python to parse the id-columns of two input csv files to different datatpyes. df1.id was of type Object. df2.id was of type int. and i needed to find out why...

Combine two rows based on common ID

sql,tsql,merge,sql-server-2012

You can do this by aggregation: select ID, max(ColumnA) ColumnA, max(ColumnB) ColumnB from TableName group by ID ...

Combine or merge 2 array with loop or function

c,arrays,for-loop,merge

A straightforward approach can look the following way #include <stdio.h> #define N 5 int main( void ) { int a[N] = { 3, 2, 2, 4, 5 }; int b[N] = { 6, 3, 1, 2, 9 }; int c[N][2]; for ( size_t i = 0; i < N; i++...

Git: Why is only 1 merge showing in my history when I have done several?

git,version-control,merge,branch,branching-and-merging

* | 54bd96c This is the single time when you commited both in your master branch and a feature branch. A usual merge was used, resulting in this commit: * 19d189f <- Here I merged back in In all other cases you merged a branch, having no commits made to...

Merging Multiple Arrays Evenly/Alternating with Javascript and Google AppScript

javascript,arrays,google-apps-script,merge

Use a for loop and the push() method like this : function test(){ var title = ["sometitle1","sometitle2","sometitle3"]; var link = ["somelink1","somelink2","somelink3"]; var date = ["somedate1","somedate2","somedate3"]; var data = ["somedata1","somedata2","somedata3"]; //var all = [title,link,date,data]; var mix = []; for(var n=0;n<title.length;n++){ mix.push(title[n],link[n],date[n],data[n]); } Logger.log(JSON.stringify(mix)); } And also : title[i] + "\n" for...

How to update SQL table from other table when they are on different servers

sql,sql-server,database,merge,sql-update

You need to use this syntax when updating with a join: UPDATE s SET s.[columnName] = l.[columnName] FROM [Server].[ServerDB].[dbo].[tableName] s INNER JOIN [LocalDB].[dbo].[tableName] l ON l.id = s.id ...

Get result of merging a PR while it is already merged

git,github,merge,refs

The following should do the trick even though you should be aware that there are possibly multiple "children" of a commit (someone else could base work on the PR and merge it into master again later): $ git rev-list -n1 upstream/pull/<number>..upstream/master This works by getting the first commit walking from...

Merge two linked lists Order

list,merge,order

Presumably, ascending order. :) Kidding. If you mean "order of magnitude", the following solution will be O(m+n) or O(max(m,n)) where m is l1.length and n is l2.length. Algorithm: Keep a pointer to each linked list, step through both, and add the lesser of the two elements. If the elements are...

Git Merge Driver - How to find out full path of merged file?

git,merge,git-merge

The original path has been added as a new parameter P% that can be used when calling the merge driver. https://github.com/git/git/commit/ef45bb1f8156030446658d5bfb3983ce214a9e16 I'm looking forward to a further Git release :)...

git - create a new branch from local copy and then merge it with existing branch

git,version-control,merge,gitlab,pull

Assuming you mean that you made a local copy of the root folder and worked on it (without the .git directory), simply go back to the original directory and make sure you are up to date with git pull. Then, take your local copy and copy it over the original...

combining several iterations of same object in different location using .add() or .merge()

merge,three.js,geometry,rendering,mesh

Use the matrix4 toolset for translation (and rotation if you want), then merge your geometrys: var geometry = new THREE.TorusGeometry( 11, 0.5, 16, 100 ); var mergeGeometry = new THREE.Geometry(); var matrix = new THREE.Matrix4(); for( i = 1; i <= 50; i++ ) { matrix.makeTranslation( 0, 3.4 * i,...

Sub-directory into independent repository and later merge back into main repository

git,merge,subtree

One-liner which solves this: git merge -s subtree directory_a_branch master ...

R merge strange behavior

r,function,merge

To keep the original order, you can use match: my_df$my_id <- id_df$my_id[match(my_df$id, id_df$id)] my_df # id my_id #1 click a1 #2 click a1 #3 impression a4 #4 visibility a6 #5 click a1 benchmark comparision between merge and match for your specific case, considering 60000 different ids and 100000 rows for...

Merge 2 xml files using XSLT in unix

xml,unix,xslt,merge

I think you want to do: <xsl:stylesheet version="1.0" xmlns:xsl="http://www.w3.org/1999/XSL/Transform"> <xsl:output indent="yes" omit-xml-declaration="yes"/> <xsl:template match="@*|node()"> <xsl:copy> <xsl:apply-templates select="@*|node()" /> </xsl:copy> </xsl:template> <xsl:template match="timings"> <xsl:variable name="match" select="document('file2.xml')/Schedule/taskItem[measurements/measurement=current()/../measurements/measurement]/timings"/>...

Create a branch from master with removed code

git,merge,branch

First, you should save your current master branch as a development branch, using git checkout -b development Next, you need to restore your master (because master is not for development, consider it sacrosanct unless you are the sole developer and you know what you are doing). git branch -D master...

python merging pairs lists within sublists within a list by comparing previous pair's second number with next pair's first number [duplicate]

python,list,for-loop,merge,comparison

From the link above: def merge(times): saved = list(times[0]) for st, en in sorted([sorted(t) for t in times]): if st <= saved[1]: saved[1] = max(saved[1], en) else: yield list(saved) saved[0] = st saved[1] = en yield list(saved) >>>mylist = [[[0, 2], [2, 9]], [[3, 7], [7, 9], [9, 12], [15,...

Win7 Batch File - Moving Subfolders(& Files) to Grand-Parent Directory

batch-file,cmd,merge,move,subdirectories

Challenge: accepted. Wouldn't it be nice if this functionality were built into robocopy, xcopy, fso.CopyFile, PowerShell's Move-Item, or any other utility or scripting object method? You probably ought to test this on a copy of the hierarchy. I did some minimal testing and it seemed to work as intended, but...

Reverse Merge and svn:mergeinfo

svn,version-control,merge

I've given this further thought, and the whole premise seems flawed; our original idea was to discard both the original revision and the subsequent reverse-merge revision from the list of eligible revisions returned by mergeinfo but there is no guarantee that the subsequent revision (in which the reverse merge was...

Push git repository to remote subversion with history

git,svn,merge,git-svn

Yes, dcommit will preserve the history granted you have rebased (thus have no merge commits to be pushed). Username at svn for all revisions will keep the credentials of the pusher though.

How can I combine elements at the same index from separate lists?

java,list,loops,merge

First, the code you have won't compile. It should be: List<String> list1 = Arrays.asList("1One","1Two","1Three"); List<String> list2 = Arrays.asList("2One","2Two","2Three"); Next, it is best to use an Iterator than access a List by index: public List<String> concat(final List<String> list1, final List<String> list2) { final Iterator<String> i1 = list1.iterator(); final Iterator<String> i2 =...

Can't access elements of merged arrays

php,arrays,merge

Because image is object, protected and private properties have special character prepended when you cast object to array. With post you are casting array to array. If you do something like (array)$post[0] you will get same issue with both objects. Take a look how to get array out of it:...

Merge a large list of logical vectors

r,list,merge,bigdata

You can use Reduce Reduce('|', ll) Benchmarks set.seed(1) ll <- replicate(144, sample(c(TRUE, FALSE), 1e5, replace=TRUE), simplify=FALSE) system.time(apply(do.call(cbind, ll), 1, any)) # user system elapsed # 0.575 0.022 0.598 system.time(Reduce(`|`, ll)) # user system elapsed # 0.287 0.008 0.295 ...

pandas: join two table and populate value when even there is not a match

python,pandas,merge

I don't think the issue is the merge, but rather you need to define what values are missing. I would do this by making an intermediate dataframe that has all the Time & ID combos you want to be present in the final dataframe: df1a = pd.DataFrame({'Time': [1,1,2,2], 'BinID': ['x']*4,...

Merging nodes with the same data using Neo4j

merge,neo4j,cypher,nodes,graph-databases

Adding to Luannes answer. You need to use Labels and provide constraints! LOAD CSV WITH HEADERS FROM 'asdfjkl;' AS line MERGE (u:User {user: line.user }) MERGE (v:Video {video: line.video}) MERGE (u)-[:VIEW]->(v) RETURN u, v You need to create a constraint on :User(user) and :Video(video)` for it to work correctly. If...

do not let git merge delete a file

git,merge

If (for whatever reason) --no-commit really isn't working for you, go ahead and do the merge. Then, do a git checkout head~ path/to/file. Then, do a commit --amend. This will amend the merge commit to have the deleted file as it was in branch B before the merge.

How to merge multiple columns values into one column?

r,merge

Try do.call library(stringr) newdat <- data.frame(TEXT=str_trim(do.call(paste, stemmoutput)), stringsAsFactors=FALSE) newdat # TEXT #1 tanaman cabai #2 banget hama sakit tanaman #3 koramil nogosari melaks ecek hama tanaman padi ppl ds rambun It may be better to use , as delimiter if there are multi-part words within a column TEXT <- gsub(',...

R: Data frame operations: filtering common rows and removing rows of several data frames

r,merge,dataframes,subset

this should work: library(dplyr) inner_join(dfA, dfB) %>% anti_join(dfC) which gives: Efficiency Value 1 8 7 2 2 4 ...

R loading multiple excel files and merge

r,loops,merge,excel-2007,lapply

Try library(tools) source <- file_path_sans_ext(filelist) files1 <- Map(cbind, files, Source=source) files1 #[[1]] # Col1 Col2 Source #1 A 0.5365853 Filname1 #2 A 0.4196231 Filname1 #[[2]] # Col1 Col2 Source #1 A 0.847460 Filname2 #2 C 0.266022 Filname2 #[[3]] # Col1 Col2 Source #1 C -0.4664951 Filname3 #2 C -0.8483700 Filname3...

skip the empty dataframes and produce the output

r,merge,ggplot2,tidyr,rpostgresql

Judging from the error message, the data.frame that causes the error has neither rows nor columns, it seems to be NULL. So the easiest way would be to check for that situation and if the data.frame is NULL, create a a dummy that can be merge()d and gather()ed. What I...

Linux awk merge two files

linux,awk,merge

You're going about this wrong. What you are describing is a join operation and there is a perfectly good UNIX tool for that with a very obvious name: $ join file1 file2 | column -t Key Column1 Column2 Column3 Column4 Column5 Test1 500 400 200 Good Good Test2 499 400...

Merge Only When Value is Empty/Null in Pandas

python,pandas,merge

OK assuming that your (null) values are in fact NaN values and not that string then the following works: In [10]: # create the merged df merged = dfA.merge(dfB, on='date') merged Out[10]: date impressions spend col_x col_y 0 2015-01-01 100000 3 ABC123456 NaN 1 2015-01-02 145000 5 ABCD00000 NaN 2...

Merging branches in GIT - What does this message mean

git,merge,atlassian-sourcetree

I'm willing to bet that you've already merged your branches together, and that this was a fast-forward merge. Your master branch is ahead of the origin by however many commits you had on your previous branch; in this case, it's 17. In a fast-forward merge, there's no merge commit, and...

Backport of `.merge()` for Angular 1.3.x

javascript,angularjs,merge

Just look at the actual code, it's very well documented and you should be able to mimic it for yourself https://code.angularjs.org/1.4.0-rc.2/angular.js: Line 459 Merge function: function merge(dst) { return baseExtend(dst, slice.call(arguments, 1), true); } Which uses the baseExtend function function baseExtend(dst, objs, deep) { var h = dst.$$hashKey; for (var...

Merge table in Oracle with delete condition refering to source table

sql,database,oracle11g,merge

The correct answer is indeed C, this is because the source of the merge operation is the monthly_orders table, which only contains two records with order_id 2 and 3 respectively. Think about what will happen for each of these records: For order_id = 2, because this id exists in the...

MS Word Mail Merge and Split Documents saving, Header and footer issue

vba,merge,word-vba,mailmerge

This is just an answer to the second part: This line: If InStr(oField.Code.Text, "Ref") > 0 Then Is finding the mergefield with "Ref" in it. If you need a different mergefield, you should put the name of the mergefield you wish to save the file as where "Ref" is, so...

Differences between 2 branches after merge: GIT

git,version-control,merge,git-diff

and therefore the everything that is in master should be in NC12-changePassword That's not what "merge" means, and therefore not what git merge does. Let's take a very simple example for illustration. Suppose you made a branch off master and, as part or even all of that branch, you...

Do I need to checkout and pull a remote git branch before I merge it in?

git,merge,git-merge,git-flow

You can directly pull your remote branch develop, but you may need to mention the remote repository (in your case, origin): git checkout feature git pull origin develop This will result in a merge commit, where the message mentions origin/develop. Without mentioning the remote repo, I'm afraid that the merge...

Git: redo merge with a different branch

git,merge

If the two branches upstream-topic and upstream-master really contain the same content and only differ in those extra merge commits, then you can simply reuse the content of your merged upstream-topic to solve the merge conflicts in upstream-master: # save the current master which merged upstream-topic git branch merged-topic #...

Where is HEAD in the in the tree if I merge a branch, do some commits and then checkout the branch again

git,merge

If I checkout the branch again is HEAD still at the most recent commit position in my tree? No, HEAD would be at the merge commit (when you did git checkout master ; git merge yourBranch_bug1) testing may send back that original bug I worked on If testing was...

Merge one dataframe with a date vector

r,date,merge

If you just want to to check the dates in daily_vector not in ss$Date_R, you don't need to add a new column. Instead, you can use ss$Date_R <- as.Date(ss$Date_R) daily_vector <- seq(as.Date("1985-01-01"), as.Date("2010-10-14"), by="days") missing <- !daily_vector %in% ss$Date_R daily_vector[missing] This will return the dates missing in ss$Date_R as a...

three.js merge geometry and octree selection

merge,three.js,geometry,selection,octree

When setting up your octree make sure undeferred is set to true. Like this - octree = new THREE.Octree( { undeferred: true, depthMax: Infinity, objectsThreshold: 8, overlapPct: 0.15 } ); That should do the trick!...

Messed up a merge when trying to upgrade my Laravel application

git,laravel,github,merge

When you did the git reset --soft HEAD~1, you "moved backwards" a commit, while keeping your working directory and index the same. So when you committed, the files were changed as if you had done the merge, without doing an actual merge; i.e., your commit had only one parent. I'm...

git merge upstream and the rebase further down causes me to merge again

git,merge

Instead of having merged 10c: X--x--x--M (10c) --x--x--x (3c, master) / / u--u--u--u--u (upstream/master) It would have been best to rebase 10c on top of upstream/master. Considering the current situation, where you have 10 commits (from X to M, excluding the merge commit), then 3 commits, you could do: #...

Unexpected behavior with merge and dplyr's left_join

r,merge,left-join

In follow up to the above useful comments if you do not mention the column names with which you want to left_join() or merge() the data frames, then all the columns with the common column names will be considered. You are getting NA in the last two places of var2...

Extracting a column from one dataset and creating another dataset with columns from a third dataset in R [duplicate]

r,data,merge,data.frame

does this answer your need ? merge(df1, df2, by.x=c("ID","DOB")) ...

Interactively merge files tracked with git and untracked local files

git,command-line,merge,diff,interactive

git checkout --patch selects diff hunks, simplest here might be to put your content at the upstream path, do that, and clean up after: cp config config.example git checkout -p upstream config.example mv config.example config git checkout @ config.example that will get you the two-diff hunk selection from git add...

merging matrices with cbind and match: name of the last column is dropped

r,matrix,merge,lapply,cbind

Try drop=FALSE. When there is a single column, you can keep the structure intact with drop=FALSE as it can change from matrix to vector by dropping the dimension attribute. Reduce(function(a,b){ ab <- cbind(a, b[match(rownames(a), rownames(b)), ,drop=FALSE]) ab <- ab[order(rownames(ab)), ] ab },Filter(is.matrix, lst)) # a b c d e #X2005.06...

Combining jQuery code - ImagesLoaded + Shuffle.js

jquery,merge,shuffle,imagesloaded

After a few hours of experimenting, I finally got it. You're right that I wasn't calling it. I also forgot to change $grid.shuffle to $shuffle.shuffle upon merging. That still didn't do the trick, so I changed the setupSorting function (and subsequently, some html) to more closely match the author's (here)...

How to properly merge 2 ontologies with OWL API 4 or 3.5

java,merge,ontology,owl-api

The namespace for the ontologies is not the issue - the problem is when the ontologies have the same ontology id. In that case, they cannot be merged in the same manager - the manager needs the relation ontologyID->ontology to be functional. To be able to use the same ontology...

Merging strategy with a long development branch. How to prevent heavy conflicts in the future merge?

git,merge,branch,branching-and-merging,branching-strategy

What I would do is, after making a small change on master, merge master into long project. That way when you merge long project into master, there will be fewer (if any) conflicts.

how to merge demensional arrays

javascript,arrays,json,multidimensional-array,merge

The following code will merge all levels of the two tree arrays, not just on the upper most level: var list1 = ... var list2 = ... var addNode = function(nodeId, array) { array.push({id: nodeId, children: []}); }; var placeNodeInTree = function(nodeId, parent, treeList) { return treeList.some(function(currentNode){ // If currentNode...

Git merge internals

git,github,merge,git-merge

My first question is the case (0, 0, 1) Some version control systems like darcs consider that doing the same change (in your case, deletion) in two branches and merging them should lead to a conflict. The typical example is when you have twice -#define NUMBER_OF_WHATEVER 42 +#define NUMBER_OF_WHATEVER...

GIT Source Tree Merge Develop Branch into Stage Branch Conflict

git,merge,conflict

You indeed just need to commit and push at that point.

Cannot allocate vector on a 33k row table merge table

r,merge,allocation

If the zip code information is in column ZipCode for table Stores and in region for table demo, what you need is foo=merge(Stores, demo, by.x = 'ZipCode', by.y = 'region') Hope it helps...

R: Avoid loop or row apply function

r,merge,data.frame,data.table

Here is something you can try, using merge and relevant ordering (order): # order the data.frames df_sales <- df_sales[order(-df_sales$STORE, -df_sales$ITEM, df_sales$DATE_SALE, decreasing=T), ] df_supply <- df_supply[order(-df_supply$STORE, -df_supply$ITEM, df_supply$DATE_SUPPLY, decreasing=T), ] # merge the data.frames res <- merge(df_sales, df_supply, by=c("STORE","ITEM"), all=T) # keep only records with DATE_SUPPLY anterior to DATE_SALE res...

How can I operate on elements of a data.frame in r, that creates a new column? [duplicate]

r,merge,data.frame,aggregate

library(dplyr) df <- read.table(text = "a b d 1 2 4 1 2 5 1 2 6 2 1 5 2 3 6 2 1 1 " , header = T) df %>% group_by(a , b) %>% mutate(m = mean(d)) ...

Merging two simple javascript functions into one

javascript,jquery,html,function,merge

Working demo: https://jsfiddle.net/20m6eLxx/ HTML <input id="inpMinutes" type="number" min="1" value="1" data-oldvalue="1" data-regex="^([0-9]{1,2}|[1-5][0-9]{2}|600)$" /> <span id="minuteS">minute</span> JS $('#inpMinutes').on('input', function (e) { var $target = $(e.target), val = $target.val(), rgx = new RegExp($target.attr('data-regex')); if (!rgx.test(val)) { $target.val($target.attr('data-oldvalue')); return; } $target.attr('data-oldvalue', $target.val()); $('#minuteS').html(val > 1 ? 'minutes' : 'minute'); });...

Java Arraylist want to merge the objects if they have the same property value

java,object,arraylist,properties,merge

First create a class to handle this datas. There's two important points to note. The equals and hashcode method are only based with the isbn and palletNumber values and there is a merge method that returns a new instance of PackingListRow with the quantities between this and an other instance...

MySQL: Merging two tables together

mysql,merge

Eventually what worked for me was exporting both tables' structures and taking their add column queries in an excel column and removing the duplicates and just creating a new query with the unique queries that were left which are the unique columns in both tables.

How to import bugfix of master in all other branches without including the commits before?

git,version-control,merge,git-branch

Merge instead of cherry-pick! cherry-pick makes a new commit on your branch, and that commit doesn't not refer to where the bugfix was originally created, hiding actual history. Furthermore, the bugfix could be several commits, or have further development in the future (like, it didn't turn out to really fix...

Merge Into with no rows

sql-server,tsql,merge

If you're generating the inside query, and the outside query is matching on an predefined ID field, the following will work: MERGE INTO tester AS Target USING ( select null as test1 --generate select null, alias as your id field ) as SOURCE on target.test1 = source.test1 WHEN NOT MATCHED...

Easy way to switch/swap git checkins between 2 branches

git,version-control,merge,branch

checkout to the develop branch git checkout develop create a new branch on top of develop to save results. Don't checkout! git branch alternative Reduce develop to common ancestor with newoverview, which seems to be the previous commit. If it's not the previous commit, use last common ancestor's SHA instead...

Captcha with merging a number with real image

image,image-processing,merge,captcha

Google sources these Captcha images from Street View imagery. Direct quote from Google spokesperson: We’re currently running an experiment in which characters from Street View images are appearing in CAPTCHAs. We often extract data such as street names and traffic signs from Street View imagery to improve Google Maps with...

join two different list by id into one list

c#,list,join,merge,automapper

Join them on id and then call ToList: var productResponses = from p in products join pd in productDescriptions on p.id equals pd.id select new ProductResponse { id = p.id, language = pd.language, // ... } var list = productResponses.ToList(); ...

Merge Excel columns into one worksheet by using VBA

excel,vba,excel-vba,merge

Try this: Sub merge() Dim Sh As Worksheet, ShM As Worksheet, i&, z& Application.ScreenUpdating = 0 Set Sh = Worksheets.Add(, Sheets(Sheets.Count)) Sh.Name = "consolidated" For Each ShM In ThisWorkbook.Worksheets If ShM.Name <> Sh.Name Then i = ShM.Cells(Rows.Count, 45).End(xlUp).Row z = Sh.Cells(Rows.Count, 1).End(xlUp).Row + 1 ShM.Activate: ShM.Range(Cells(1, 45), Cells(i, 45)).Copy Sh.Activate:...

GitHub merge failed and deleted half my project

git,github,merge,github-for-windows

How to find your files First check if the merge is really over. Try git merge --abort Are your files already here? Good! If not, follow the next instruction. # this shows a graph of commits, # you will be able to see the commit in master before merge #...

join two data tables and use only one column from second dt in R

r,join,merge,data.table

In order to perform a left join to df1 and add H column from df2, you can combine binary join with the update by reference operator (:=) setkey(setDT(dt1), A) dt1[dt2, H := i.H] See here and here for detailed explanation on how it works With the devel version (v >=...

Extra column based on paired data (mutate)

r,merge,dplyr

Try library(dplyr) dta1 <- as.data.frame(dta) %>% group_by(householdid) %>% mutate(occupPartner= rev(occup)) as.data.frame(dta1) # idno householdid occup #1 1013661 101366 Never worked #2 1013662 101366 Intermediate occs #3 1037552 103755 Managerial & professional occs #4 1037551 103755 Intermediate occs # occupPartner #1 Intermediate occs #2 Never worked #3 Intermediate occs #4 Managerial...

Git reset and revert

git,merge,reset,revert

you are doing git log --oneline see the commits before the merge then just reverting to that commit before merging WITHOUT any reseting!!! After push again to origin as a new commit. Reverting means that your next snapshot would be equally the same as the one before merging, but your...

How to compute variance with missing value in a DataFrame - Python Pandas?

python,join,pandas,merge,dataframes

>>> df.set_index(['date', 'name']).unstack().fillna(0).apply(var) name value A 1.5000 B 1.6875 C 3.0000 dtype: float64 To arrange the DataFrame indexed on date with a MultiColumn for name and color: df.set_index(['date', 'name', 'color']).unstack([1, 2]).fillna(0) valueA valueB name A B C A B C color red green white red green white date 12/1/14 3...

Correct git operation to merge portion of a branch

git,merge,gitlab

I think you just want to merge G into D: git checkout D git merge G Afterwards your history will look like this: master A---B---C---D---M <-- HEAD \ / f1 E---F---G---H I'd advise against rebasing E-G on top of D, as it will be much harder later to merge H...