elhacker.net cabecera Bienvenido(a), Visitante. Por favor Ingresar o Registrarse
¿Perdiste tu email de activación?.

 

 


Tema destacado:


  Mostrar Mensajes
Páginas: 1 ... 563 564 565 566 567 568 569 570 571 572 573 574 575 576 577 [578] 579 580 581 582 583 584 585 586 587 588 589 590 591 592 593 ... 620
5771  Programación / Programación Visual Basic / Re: Musica XM o MOD en mi proyecto? en: 25 Abril 2010, 06:46 am
¿ Probaste buscando en Google ?

Hay muchos links de donde puedes sacar la info...

http://www.google.com.ar/search?hl=es&source=hp&q=XM+%2Bvb6&meta=&aq=f&aqi=&aql=&oq=&gs_rfai=
5772  Programación / Ingeniería Inversa / Re: Problema sobre un archivo protegido. en: 25 Abril 2010, 03:50 am
o simplemente dandome algunos tips o buenos tutoriales de como usar Ollydbg

El mejor tutorial para aprender a usar OllyDbg: http://ricardonarvaja.info/WEB/INTRODUCCION%20AL%20CRACKING%20CON%20OLLYDBG%20DESDE%20CERO/

Saludos!
5773  Programación / Programación Visual Basic / Re: Ayuda con ícono en vb6 en: 24 Abril 2010, 21:13 pm
Mejor usa Axialis IconWorkshop....  ;)
5774  Programación / ASM / Re: Color de fondo,no coinicde! en: 24 Abril 2010, 20:58 pm
Y con SendMessage?

EM_SETBKGNDCOLOR
The EM_SETBKGNDCOLOR message sets the background color for a rich edit control.

EM_SETBKGNDCOLOR
wParam = (WPARAM) (BOOL) fUseSysColor;
lParam = (LPARAM) (COLORREF) clr;
 
Parameters
fUseSysColor
Value specifying whether to use the system color. If this parameter is nonzero, the background is set to the window background system color. Otherwise, the background is set to the specified color.
clr
COLORREF structure specifying the color if fUseSysColor is zero.
Return Values
Returns the old background color.


Seria algo así:

Código:
invoke GetDC,handle_del_static
invoke SendMessage,eax,EM_SETBKGNDCOLOR,1,0

wParam es 1, por lo que se usa el color por defecto del sistema. Si usas un 0 en wParam, en lParam le deberás pasar el color que quieres, de acuerdo a:


COLORREF
The COLORREF value is a 32-bit value used to specify an RGB color.

Remarks
When specifying an explicit RGB color, the COLORREF value has the following hexadecimal form:

0x00bbggrr
 
The low-order byte contains a value for the relative intensity of red; the second byte contains a value for green; and the third byte contains a value for blue. The high-order byte must be zero. The maximum value for a single byte is 0xFF.


Saludos!
5775  Programación / Ingeniería Inversa / Re: Ferreteria Plus crack serial full GDS - Ingenieria inversa en proceso... en: 21 Abril 2010, 22:43 pm
@vortexxx: Revisa tus MP's.
@chelin-1: Envíame un MP y te paso el link de descarga (por aquí no se puede)

Saludos!
5776  Programación / Ingeniería Inversa / Re: Ferreteria Plus crack serial full GDS - Ingenieria inversa en proceso... en: 19 Abril 2010, 22:39 pm
Nada?????  :huh: :huh: :huh:

Pues di que has estado haciendo, paso por paso, a ver si podemos ayudarte...

Saludos!
5777  Programación / Ingeniería Inversa / Re: ayuda con softice en: 19 Abril 2010, 00:27 am
Hola!

Te recomiendo cambiar de debugger. Sice ya está viejito (no quiero decir que sea obsoleto, pero hoy en día tienes mejores opciones).

Para Ingeniería Inversa, lo mejor es OllyDbg debido a la info que hay dando vueltas de él. Si quieres depurar en ring 0, puedes usar WinDbg...

Saludos!
5778  Programación / Programación Visual Basic / Re: modulo clss md5 en: 18 Abril 2010, 17:15 pm
Quizás esto te ayude:
Código:
VERSION 1.0 CLASS
BEGIN
  MultiUse = -1  'True
  Persistable = 0  'NotPersistable
  DataBindingBehavior = 0  'vbNone
  DataSourceBehavior  = 0  'vbNone
  MTSTransactionMode  = 0  'NotAnMTSObject
END
Attribute VB_Name = "MD5"
Attribute VB_GlobalNameSpace = False
Attribute VB_Creatable = True
Attribute VB_PredeclaredId = False
Attribute VB_Exposed = False
Option Explicit

'  CLASE: MD5
'
'  DESCRIPCION:
'     Esta es una clase que encapsula un grupo de funciones del Algoritmo MD5.
'     El MD5 produce firmas digitales de 128 bits para bases de datos de cualquier largo.
'     Detalles en el RFC 1321. Esta implementación está derivada de la implementacion del
'     algoritmo MD5 de la RSA Data Security, Inc. (originalmente en C)
'
'  AUTOR:
'     Robert M. Hubley 12/1999
'     Modificado y traducido por MCKSys Argentina 2009
'
'
'=
'= Constantes de clase
'=
Private Const OFFSET_4 = 4294967296#
Private Const MAXINT_4 = 2147483647

Private Const S11 = 7
Private Const S12 = 12
Private Const S13 = 17
Private Const S14 = 22
Private Const S21 = 5
Private Const S22 = 9
Private Const S23 = 14
Private Const S24 = 20
Private Const S31 = 4
Private Const S32 = 11
Private Const S33 = 16
Private Const S34 = 23
Private Const S41 = 6
Private Const S42 = 10
Private Const S43 = 15
Private Const S44 = 21


'=
'= Variables de clase
'=
Private Estado(4) As Long
Private CuentaBytes As Long
Private BufferDeBytes(63) As Byte


'=
'= Propiedades de la clase
'=
Property Get RegisterA() As String
    RegisterA = Estado(1)
End Property

Property Get RegisterB() As String
    RegisterB = Estado(2)
End Property

Property Get RegisterC() As String
    RegisterC = Estado(3)
End Property

Property Get RegisterD() As String
    RegisterD = Estado(4)
End Property


'=
'= Funciones de clase
'=

'
' haya MD5 de matriz de bytes en una cadena Hexadecimal
'
Public Function DigestArrayToHexStr(Matriz() As Byte) As String
    MD5Init
    MD5Update UBound(Matriz) + 1, Matriz
    MD5Final
    DigestArrayToHexStr = GetValues
End Function

'
' Concatenar los 4 valores de Estado en un solso string
'
Public Function GetValues() As String
    GetValues = LongToString(Estado(1)) & LongToString(Estado(2)) & LongToString(Estado(3)) & LongToString(Estado(4))
End Function

'
' Convertir Long a cadena Hex
'
Private Function LongToString(Num As Long) As String
        Dim a As Byte
        Dim b As Byte
        Dim c As Byte
        Dim d As Byte
       
        a = Num And &HFF&
        If a < 16 Then
            LongToString = "0" & Hex(a)
        Else
            LongToString = Hex(a)
        End If
               
        b = (Num And &HFF00&) \ 256
        If b < 16 Then
            LongToString = LongToString & "0" & Hex(b)
        Else
            LongToString = LongToString & Hex(b)
        End If
       
        c = (Num And &HFF0000) \ 65536
        If c < 16 Then
            LongToString = LongToString & "0" & Hex(c)
        Else
            LongToString = LongToString & Hex(c)
        End If
       
        If Num < 0 Then
            d = ((Num And &H7F000000) \ 16777216) Or &H80&
        Else
            d = (Num And &HFF000000) \ 16777216
        End If
       
        If d < 16 Then
            LongToString = LongToString & "0" & Hex(d)
        Else
            LongToString = LongToString & Hex(d)
        End If
   
End Function

'
' Inicializar la clase
'   Esto debe llamarse antes de realizar cualquier cálculo
'
Public Sub MD5Init()
    CuentaBytes = 0
    Estado(1) = UnsignedToLong(1732584193#)
    Estado(2) = UnsignedToLong(4023233417#)
    Estado(3) = UnsignedToLong(2562383102#)
    Estado(4) = UnsignedToLong(271733878#)
End Sub

'
' MD5 Final
'
Public Sub MD5Final()
    Dim dblBits As Double
   
    Dim padding(72) As Byte
    Dim lngBytesBuffered As Long
   
    padding(0) = &H80
   
    dblBits = CuentaBytes * 8
   
    ' rellenar
    lngBytesBuffered = CuentaBytes Mod 64
    If lngBytesBuffered <= 56 Then
        MD5Update 56 - lngBytesBuffered, padding
    Else
        MD5Update 120 - CuentaBytes, padding
    End If
   
   
    padding(0) = UnsignedToLong(dblBits) And &HFF&
    padding(1) = UnsignedToLong(dblBits) \ 256 And &HFF&
    padding(2) = UnsignedToLong(dblBits) \ 65536 And &HFF&
    padding(3) = UnsignedToLong(dblBits) \ 16777216 And &HFF&
    padding(4) = 0
    padding(5) = 0
    padding(6) = 0
    padding(7) = 0
   
    MD5Update 8, padding
End Sub

'
' Partir datos de entrada en pedazos de 64 bytes
'
Public Sub MD5Update(InputLen As Long, InputBuffer() As Byte)
    Dim II As Integer
    Dim i As Integer
    Dim j As Integer
    Dim K As Integer
    Dim lngBufferedBytes As Long
    Dim lngBufferRemaining As Long
    Dim lngRem As Long
   
    lngBufferedBytes = CuentaBytes Mod 64
    lngBufferRemaining = 64 - lngBufferedBytes
    CuentaBytes = CuentaBytes + InputLen
    ' usar primero los resultados viejos del buffer
    If InputLen >= lngBufferRemaining Then
        For II = 0 To lngBufferRemaining - 1
            BufferDeBytes(lngBufferedBytes + II) = InputBuffer(II)
        Next II
        MD5Transform BufferDeBytes
       
        lngRem = (InputLen) Mod 64
        ' El transformador es multiplo de 64 asi que hagamos algunas transformaciones
        For i = lngBufferRemaining To InputLen - II - lngRem Step 64
            For j = 0 To 63
                BufferDeBytes(j) = InputBuffer(i + j)
            Next j
            MD5Transform BufferDeBytes
        Next i
        lngBufferedBytes = 0
    Else
      i = 0
    End If
   
    ' Buffear datos restantes
    For K = 0 To InputLen - i - 1
        BufferDeBytes(lngBufferedBytes + K) = InputBuffer(i + K)
    Next K
   
End Sub

'
' MD5 Transform
'
Private Sub MD5Transform(Buffer() As Byte)
    Dim x(16) As Long
    Dim a As Long
    Dim b As Long
    Dim c As Long
    Dim d As Long
   
    a = Estado(1)
    b = Estado(2)
    c = Estado(3)
    d = Estado(4)
   
    Decode 64, x, Buffer

    ' Pasada 1
    FF a, b, c, d, x(0), S11, -680876936
    FF d, a, b, c, x(1), S12, -389564586
    FF c, d, a, b, x(2), S13, 606105819
    FF b, c, d, a, x(3), S14, -1044525330
    FF a, b, c, d, x(4), S11, -176418897
    FF d, a, b, c, x(5), S12, 1200080426
    FF c, d, a, b, x(6), S13, -1473231341
    FF b, c, d, a, x(7), S14, -45705983
    FF a, b, c, d, x(8), S11, 1770035416
    FF d, a, b, c, x(9), S12, -1958414417
    FF c, d, a, b, x(10), S13, -42063
    FF b, c, d, a, x(11), S14, -1990404162
    FF a, b, c, d, x(12), S11, 1804603682
    FF d, a, b, c, x(13), S12, -40341101
    FF c, d, a, b, x(14), S13, -1502002290
    FF b, c, d, a, x(15), S14, 1236535329
   
    ' Pasada 2
    GG a, b, c, d, x(1), S21, -165796510
    GG d, a, b, c, x(6), S22, -1069501632
    GG c, d, a, b, x(11), S23, 643717713
    GG b, c, d, a, x(0), S24, -373897302
    GG a, b, c, d, x(5), S21, -701558691
    GG d, a, b, c, x(10), S22, 38016083
    GG c, d, a, b, x(15), S23, -660478335
    GG b, c, d, a, x(4), S24, -405537848
    GG a, b, c, d, x(9), S21, 568446438
    GG d, a, b, c, x(14), S22, -1019803690
    GG c, d, a, b, x(3), S23, -187363961
    GG b, c, d, a, x(8), S24, 1163531501
    GG a, b, c, d, x(13), S21, -1444681467
    GG d, a, b, c, x(2), S22, -51403784
    GG c, d, a, b, x(7), S23, 1735328473
    GG b, c, d, a, x(12), S24, -1926607734
   
    ' Pasada 3
    HH a, b, c, d, x(5), S31, -378558
    HH d, a, b, c, x(8), S32, -2022574463
    HH c, d, a, b, x(11), S33, 1839030562
    HH b, c, d, a, x(14), S34, -35309556
    HH a, b, c, d, x(1), S31, -1530992060
    HH d, a, b, c, x(4), S32, 1272893353
    HH c, d, a, b, x(7), S33, -155497632
    HH b, c, d, a, x(10), S34, -1094730640
    HH a, b, c, d, x(13), S31, 681279174
    HH d, a, b, c, x(0), S32, -358537222
    HH c, d, a, b, x(3), S33, -722521979
    HH b, c, d, a, x(6), S34, 76029189
    HH a, b, c, d, x(9), S31, -640364487
    HH d, a, b, c, x(12), S32, -421815835
    HH c, d, a, b, x(15), S33, 530742520
    HH b, c, d, a, x(2), S34, -995338651
   
    ' Pasada 4
    II a, b, c, d, x(0), S41, -198630844
    II d, a, b, c, x(7), S42, 1126891415
    II c, d, a, b, x(14), S43, -1416354905
    II b, c, d, a, x(5), S44, -57434055
    II a, b, c, d, x(12), S41, 1700485571
    II d, a, b, c, x(3), S42, -1894986606
    II c, d, a, b, x(10), S43, -1051523
    II b, c, d, a, x(1), S44, -2054922799
    II a, b, c, d, x(8), S41, 1873313359
    II d, a, b, c, x(15), S42, -30611744
    II c, d, a, b, x(6), S43, -1560198380
    II b, c, d, a, x(13), S44, 1309151649
    II a, b, c, d, x(4), S41, -145523070
    II d, a, b, c, x(11), S42, -1120210379
    II c, d, a, b, x(2), S43, 718787259
    II b, c, d, a, x(9), S44, -343485551
   
   
    Estado(1) = LongOverflowAdd(Estado(1), a)
    Estado(2) = LongOverflowAdd(Estado(2), b)
    Estado(3) = LongOverflowAdd(Estado(3), c)
    Estado(4) = LongOverflowAdd(Estado(4), d)

   
End Sub

Private Sub Decode(Length As Integer, OutputBuffer() As Long, InputBuffer() As Byte)
    Dim intDblIndex As Integer
    Dim intByteIndex As Integer
    Dim dblSum As Double
   
    intDblIndex = 0
    For intByteIndex = 0 To Length - 1 Step 4
        dblSum = InputBuffer(intByteIndex) + _
                                    InputBuffer(intByteIndex + 1) * 256# + _
                                    InputBuffer(intByteIndex + 2) * 65536# + _
                                    InputBuffer(intByteIndex + 3) * 16777216#
        OutputBuffer(intDblIndex) = UnsignedToLong(dblSum)
        intDblIndex = intDblIndex + 1
    Next intByteIndex
End Sub

'
' FF, GG, HH, y II para las transformaciones de la Pasada 1, 2, 3 y 4.
' La rotación es separada de la suma para prevenir recálculos
'
Private Function FF(a As Long, _
                    b As Long, _
                    c As Long, _
                    d As Long, _
                    x As Long, _
                    s As Long, _
                    ac As Long) As Long
    a = LongOverflowAdd4(a, (b And c) Or (Not (b) And d), x, ac)
    a = LongLeftRotate(a, s)
    a = LongOverflowAdd(a, b)
End Function

Private Function GG(a As Long, _
                    b As Long, _
                    c As Long, _
                    d As Long, _
                    x As Long, _
                    s As Long, _
                    ac As Long) As Long
    a = LongOverflowAdd4(a, (b And d) Or (c And Not (d)), x, ac)
    a = LongLeftRotate(a, s)
    a = LongOverflowAdd(a, b)
End Function

Private Function HH(a As Long, _
                    b As Long, _
                    c As Long, _
                    d As Long, _
                    x As Long, _
                    s As Long, _
                    ac As Long) As Long
    a = LongOverflowAdd4(a, b Xor c Xor d, x, ac)
    a = LongLeftRotate(a, s)
    a = LongOverflowAdd(a, b)
End Function

Private Function II(a As Long, _
                    b As Long, _
                    c As Long, _
                    d As Long, _
                    x As Long, _
                    s As Long, _
                    ac As Long) As Long
    a = LongOverflowAdd4(a, c Xor (b Or Not (d)), x, ac)
    a = LongLeftRotate(a, s)
    a = LongOverflowAdd(a, b)
End Function

'
' Rotar un long a la derecha
'
Function LongLeftRotate(value As Long, bits As Long) As Long
    Dim lngSign As Long
    Dim lngI As Long
    bits = bits Mod 32
    If bits = 0 Then LongLeftRotate = value: Exit Function
    For lngI = 1 To bits
        lngSign = value And &HC0000000
        value = (value And &H3FFFFFFF) * 2
        value = value Or ((lngSign < 0) And 1) Or (CBool(lngSign And _
                &H40000000) And &H80000000)
    Next
    LongLeftRotate = value
End Function

'
' Función para sumar 2 numeros sin signo como en C.
' los desbordamientos se ignoran!
'
Private Function LongOverflowAdd(Val1 As Long, Val2 As Long) As Long
    Dim lngHighWord As Long
    Dim lngLowWord As Long
    Dim lngOverflow As Long

    lngLowWord = (Val1 And &HFFFF&) + (Val2 And &HFFFF&)
    lngOverflow = lngLowWord \ 65536
    lngHighWord = (((Val1 And &HFFFF0000) \ 65536) + ((Val2 And &HFFFF0000) \ 65536) + lngOverflow) And &HFFFF&
    LongOverflowAdd = UnsignedToLong((lngHighWord * 65536#) + (lngLowWord And &HFFFF&))
End Function

'
' Función para sumar 2 numeros sin signo como en C.
' los desbordamientos se ignoran!
'
Private Function LongOverflowAdd4(Val1 As Long, Val2 As Long, val3 As Long, val4 As Long) As Long
    Dim lngHighWord As Long
    Dim lngLowWord As Long
    Dim lngOverflow As Long

    lngLowWord = (Val1 And &HFFFF&) + (Val2 And &HFFFF&) + (val3 And &HFFFF&) + (val4 And &HFFFF&)
    lngOverflow = lngLowWord \ 65536
    lngHighWord = (((Val1 And &HFFFF0000) \ 65536) + _
                   ((Val2 And &HFFFF0000) \ 65536) + _
                   ((val3 And &HFFFF0000) \ 65536) + _
                   ((val4 And &HFFFF0000) \ 65536) + _
                   lngOverflow) And &HFFFF&
    LongOverflowAdd4 = UnsignedToLong((lngHighWord * 65536#) + (lngLowWord And &HFFFF&))
End Function

'
' Convertir un double sin signo en un long
'
Private Function UnsignedToLong(value As Double) As Long
        If value < 0 Or value >= OFFSET_4 Then Error 6 ' Desbordamiento
        If value <= MAXINT_4 Then
          UnsignedToLong = value
        Else
          UnsignedToLong = value - OFFSET_4
        End If
      End Function

'
' Convertir un long en un Double sin signo
'
Private Function LongToUnsigned(value As Long) As Double
        If value < 0 Then
          LongToUnsigned = value + OFFSET_4
        Else
          LongToUnsigned = value
        End If
End Function

Saludos!
5779  Programación / Ingeniería Inversa / Re: Luchando con Xprotector. en: 16 Abril 2010, 22:12 pm
Un link de descarga del instalador sería lo más conveniente....  ;D

A menos que la "gula" sea mayor  :xD :xD :xD

Saludos!
5780  Programación / Programación Visual Basic / Re: [Source] VB6 Bruteforce (mejorado) en: 16 Abril 2010, 03:38 am
Esta es una alternativa con 2 bucles:

Código:
Sub BruteForce(MaxDigitos As Integer)
'a = 97
'z = 122
Dim Serial As String
Dim Terminado As Boolean
Dim Terminado2 As Boolean
Dim i As Integer
Dim c As Byte
Dim j As Integer
Dim pos As Integer

Serial = Space(MaxDigitos)

Open App.Path & "\midicionario.txt" For Output As #1

Mid(Serial, 1, 1) = "a"
Print #1, Trim(Serial)

Terminado = False

Do While Not Terminado
    pos = 1
    Terminado2 = False
    Do While Not Terminado2
        DoEvents
        c = Asc(Mid(Serial, pos, 1))
        'contempla char espacio
        If c < 97 Then
            c = 97
        Else
            c = c + 1
        End If
        If c < 123 Then
            Mid(Serial, pos, 1) = Chr(c)
            Terminado2 = True
        Else
            Mid(Serial, pos, 1) = "a"
            pos = pos + 1
        End If
    Loop
    Print #1, Trim(Serial)
    Terminado = True
    For j = 1 To MaxDigitos
        Terminado = Terminado And (Mid(Serial, j, 1) = "z")
    Next j
Loop
Close #1
MsgBox "listo"
End Sub

Saludos!
Páginas: 1 ... 563 564 565 566 567 568 569 570 571 572 573 574 575 576 577 [578] 579 580 581 582 583 584 585 586 587 588 589 590 591 592 593 ... 620
WAP2 - Aviso Legal - Powered by SMF 1.1.21 | SMF © 2006-2008, Simple Machines