]>
git.saurik.com Git - apple/libc.git/blob - stdlib/radixsort.c
2 * Copyright (c) 1999 Apple Computer, Inc. All rights reserved.
4 * @APPLE_LICENSE_HEADER_START@
6 * Copyright (c) 1999-2003 Apple Computer, Inc. All Rights Reserved.
8 * This file contains Original Code and/or Modifications of Original Code
9 * as defined in and that are subject to the Apple Public Source License
10 * Version 2.0 (the 'License'). You may not use this file except in
11 * compliance with the License. Please obtain a copy of the License at
12 * http://www.opensource.apple.com/apsl/ and read it before using this
15 * The Original Code and all software distributed under the License are
16 * distributed on an 'AS IS' basis, WITHOUT WARRANTY OF ANY KIND, EITHER
17 * EXPRESS OR IMPLIED, AND APPLE HEREBY DISCLAIMS ALL SUCH WARRANTIES,
18 * INCLUDING WITHOUT LIMITATION, ANY WARRANTIES OF MERCHANTABILITY,
19 * FITNESS FOR A PARTICULAR PURPOSE, QUIET ENJOYMENT OR NON-INFRINGEMENT.
20 * Please see the License for the specific language governing rights and
21 * limitations under the License.
23 * @APPLE_LICENSE_HEADER_END@
26 * Copyright (c) 1990, 1993
27 * The Regents of the University of California. All rights reserved.
29 * This code is derived from software contributed to Berkeley by
30 * Peter McIlroy and by Dan Bernstein at New York University,
32 * Redistribution and use in source and binary forms, with or without
33 * modification, are permitted provided that the following conditions
35 * 1. Redistributions of source code must retain the above copyright
36 * notice, this list of conditions and the following disclaimer.
37 * 2. Redistributions in binary form must reproduce the above copyright
38 * notice, this list of conditions and the following disclaimer in the
39 * documentation and/or other materials provided with the distribution.
40 * 3. All advertising materials mentioning features or use of this software
41 * must display the following acknowledgement:
42 * This product includes software developed by the University of
43 * California, Berkeley and its contributors.
44 * 4. Neither the name of the University nor the names of its contributors
45 * may be used to endorse or promote products derived from this software
46 * without specific prior written permission.
48 * THIS SOFTWARE IS PROVIDED BY THE REGENTS AND CONTRIBUTORS ``AS IS'' AND
49 * ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE
50 * IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE
51 * ARE DISCLAIMED. IN NO EVENT SHALL THE REGENTS OR CONTRIBUTORS BE LIABLE
52 * FOR ANY DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR CONSEQUENTIAL
53 * DAMAGES (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS
54 * OR SERVICES; LOSS OF USE, DATA, OR PROFITS; OR BUSINESS INTERRUPTION)
55 * HOWEVER CAUSED AND ON ANY THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT
56 * LIABILITY, OR TORT (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY
57 * OUT OF THE USE OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF
65 * Program r_sort_a() is unstable but uses O(logN) extra memory for a stack.
66 * Use radixsort(a, n, trace, endchar) for this case.
68 * For stable sorting (using N extra pointers) use sradixsort(), which calls
71 * For a description of this code, see D. McIlroy, P. McIlroy, K. Bostic,
72 * "Engineering Radix Sort".
75 #include <sys/types.h>
85 static inline void simplesort
86 __P((const u_char
**, int, int, const u_char
*, u_int
));
87 static void r_sort_a
__P((const u_char
**, int, int, const u_char
*, u_int
));
88 static void r_sort_b
__P((const u_char
**,
89 const u_char
**, int, int, const u_char
*, u_int
));
91 #define THRESHOLD 20 /* Divert to simplesort(). */
92 #define SIZE 512 /* Default stack size. */
97 for (c = 0; c < endch; c++) \
100 for (c++; c < 256; c++) \
104 endch = tab[endch]; \
106 if (endch != 0 && endch != 255) { \
114 radixsort(a
, n
, tab
, endch
)
115 const u_char
**a
, *tab
;
124 r_sort_a(a
, n
, 0, tr
, endch
);
129 sradixsort(a
, n
, tab
, endch
)
130 const u_char
**a
, *tab
;
134 const u_char
*tr
, **ta
;
140 simplesort(a
, n
, 0, tr
, endch
);
142 if ((ta
= malloc(n
* sizeof(a
))) == NULL
)
144 r_sort_b(a
, ta
, n
, 0, tr
, endch
);
150 #define empty(s) (s >= sp)
151 #define pop(a, n, i) a = (--sp)->sa, n = sp->sn, i = sp->si
152 #define push(a, n, i) sp->sa = a, sp->sn = n, (sp++)->si = i
153 #define swap(a, b, t) t = a, a = b, b = t
155 /* Unstable, in-place sort. */
157 r_sort_a(a
, n
, i
, tr
, endch
)
163 static int *count
= NULL
, nc
, bmin
;
165 register const u_char
**ak
, *r
;
166 stack s
[SIZE
], *sp
, *sp0
, *sp1
, temp
;
168 const u_char
**an
, *t
, **aj
, **top
[256];
170 if( count
== NULL
) {
171 count
= malloc(256*sizeof(int));
182 simplesort(a
, n
, i
, tr
, endch
);
187 /* Make character histogram. */
189 bmin
= 255; /* First occupied bin, excluding eos. */
190 for (ak
= a
; ak
< an
;) {
192 if (++count
[c
] == 1 && c
!= endch
) {
198 if (sp
+ nc
> s
+ SIZE
) { /* Get more stack. */
199 r_sort_a(a
, n
, i
, tr
, endch
);
205 * Set top[]; push incompletely sorted bins onto stack.
206 * top[] = pointers to last out-of-place element in bins.
207 * count[] = counts of elements in bins.
208 * Before permuting: top[c-1] + count[c] = top[c];
209 * during deal: top[c] counts down to top[c-1].
211 sp0
= sp1
= sp
; /* Stack position of biggest bin. */
212 bigc
= 2; /* Size of biggest bin. */
213 if (endch
== 0) /* Special case: set top[eos]. */
214 top
[0] = ak
= a
+ count
[0];
219 for (cp
= count
+ bmin
; nc
> 0; cp
++) {
220 while (*cp
== 0) /* Find next non-empty pile. */
229 top
[cp
-count
] = ak
+= *cp
;
232 swap(*sp0
, *sp1
, temp
); /* Play it safe -- biggest bin last. */
235 * Permute misplacements home. Already home: everything
236 * before aj, and in bin[c], items from top[c] on.
238 * r = next element to put in place;
239 * ak = top[r[i]] = location to put the next element.
240 * aj = bottom of 1st disordered bin.
242 * Once the 1st disordered bin is done, ie. aj >= ak,
243 * aj<-aj + count[c] connects the bins in a linked list;
246 for (aj
= a
; aj
< an
; *aj
= r
, aj
+= count
[c
], count
[c
] = 0)
247 for (r
= *aj
; aj
< (ak
= --top
[c
= tr
[r
[i
]]]);)
252 /* Stable sort, requiring additional memory. */
254 r_sort_b(a
, ta
, n
, i
, tr
, endch
)
255 const u_char
**a
, **ta
;
260 static int *count
= NULL
, nc
, bmin
;
262 register const u_char
**ak
, **ai
;
263 stack s
[512], *sp
, *sp0
, *sp1
, temp
;
264 const u_char
**top
[256];
267 if( count
== NULL
) {
268 count
= malloc(256*sizeof(int));
278 simplesort(a
, n
, i
, tr
, endch
);
284 for (ak
= a
+ n
; --ak
>= a
;) {
286 if (++count
[c
] == 1 && c
!= endch
) {
292 if (sp
+ nc
> s
+ SIZE
) {
293 r_sort_b(a
, ta
, n
, i
, tr
, endch
);
301 top
[0] = ak
= a
+ count
[0];
308 for (cp
= count
+ bmin
; nc
> 0; cp
++) {
318 top
[cp
-count
] = ak
+= c
;
319 *cp
= 0; /* Reset count[]. */
322 swap(*sp0
, *sp1
, temp
);
324 for (ak
= ta
+ n
, ai
= a
+n
; ak
> ta
;) /* Copy to temp. */
326 for (ak
= ta
+n
; --ak
>= ta
;) /* Deal to piles. */
327 *--top
[tr
[(*ak
)[i
]]] = *ak
;
332 simplesort(a
, n
, b
, tr
, endch
) /* insertion sort */
333 register const u_char
**a
;
335 register const u_char
*tr
;
339 const u_char
**ak
, **ai
, *s
, *t
;
341 for (ak
= a
+1; --n
>= 1; ak
++)
342 for (ai
= ak
; ai
> a
; ai
--) {
343 for (s
= ai
[0] + b
, t
= ai
[-1] + b
;
344 (ch
= tr
[*s
]) != endch
; s
++, t
++)
349 swap(ai
[0], ai
[-1], s
);